hexsha
stringlengths 40
40
| size
int64 3
1.05M
| ext
stringclasses 163
values | lang
stringclasses 53
values | max_stars_repo_path
stringlengths 3
945
| max_stars_repo_name
stringlengths 4
112
| max_stars_repo_head_hexsha
stringlengths 40
78
| max_stars_repo_licenses
sequencelengths 1
10
| max_stars_count
float64 1
191k
⌀ | max_stars_repo_stars_event_min_datetime
stringlengths 24
24
⌀ | max_stars_repo_stars_event_max_datetime
stringlengths 24
24
⌀ | max_issues_repo_path
stringlengths 3
945
| max_issues_repo_name
stringlengths 4
113
| max_issues_repo_head_hexsha
stringlengths 40
78
| max_issues_repo_licenses
sequencelengths 1
10
| max_issues_count
float64 1
116k
⌀ | max_issues_repo_issues_event_min_datetime
stringlengths 24
24
⌀ | max_issues_repo_issues_event_max_datetime
stringlengths 24
24
⌀ | max_forks_repo_path
stringlengths 3
945
| max_forks_repo_name
stringlengths 4
113
| max_forks_repo_head_hexsha
stringlengths 40
78
| max_forks_repo_licenses
sequencelengths 1
10
| max_forks_count
float64 1
105k
⌀ | max_forks_repo_forks_event_min_datetime
stringlengths 24
24
⌀ | max_forks_repo_forks_event_max_datetime
stringlengths 24
24
⌀ | content
stringlengths 3
1.05M
| avg_line_length
float64 1
966k
| max_line_length
int64 1
977k
| alphanum_fraction
float64 0
1
|
---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|
ad4ffbee96d1deaf85e2eabcffc26c522fbb75a3 | 4,844 | ads | Ada | gcc-gcc-7_3_0-release/gcc/ada/s-osprim.ads | best08618/asylo | 5a520a9f5c461ede0f32acc284017b737a43898c | [
"Apache-2.0"
] | 7 | 2020-05-02T17:34:05.000Z | 2021-10-17T10:15:18.000Z | gcc-gcc-7_3_0-release/gcc/ada/s-osprim.ads | best08618/asylo | 5a520a9f5c461ede0f32acc284017b737a43898c | [
"Apache-2.0"
] | null | null | null | gcc-gcc-7_3_0-release/gcc/ada/s-osprim.ads | best08618/asylo | 5a520a9f5c461ede0f32acc284017b737a43898c | [
"Apache-2.0"
] | 2 | 2020-07-27T00:22:36.000Z | 2021-04-01T09:41:02.000Z | ------------------------------------------------------------------------------
-- --
-- GNAT RUN-TIME LIBRARY (GNARL) COMPONENTS --
-- --
-- S Y S T E M . O S _ P R I M I T I V E S --
-- --
-- S p e c --
-- --
-- Copyright (C) 1998-2015, Free Software Foundation, Inc. --
-- --
-- GNARL is free software; you can redistribute it and/or modify it under --
-- terms of the GNU General Public License as published by the Free Soft- --
-- ware Foundation; either version 3, or (at your option) any later ver- --
-- sion. GNAT is distributed in the hope that it will be useful, but WITH- --
-- OUT ANY WARRANTY; without even the implied warranty of MERCHANTABILITY --
-- or FITNESS FOR A PARTICULAR PURPOSE. --
-- --
-- As a special exception under Section 7 of GPL version 3, you are granted --
-- additional permissions described in the GCC Runtime Library Exception, --
-- version 3.1, as published by the Free Software Foundation. --
-- --
-- You should have received a copy of the GNU General Public License and --
-- a copy of the GCC Runtime Library Exception along with this program; --
-- see the files COPYING3 and COPYING.RUNTIME respectively. If not, see --
-- <http://www.gnu.org/licenses/>. --
-- --
-- GNARL was developed by the GNARL team at Florida State University. --
-- Extensive contributions were provided by Ada Core Technologies, Inc. --
-- --
------------------------------------------------------------------------------
-- This package provides low level primitives used to implement clock and
-- delays in non tasking applications.
-- The choice of the real clock/delay implementation (depending on whether
-- tasking is involved or not) is done via soft links (see s-soflin.ads)
-- NEVER add any dependency to tasking packages here
package System.OS_Primitives is
pragma Preelaborate;
Max_Sensible_Delay : constant Duration :=
Duration'Min (183 * 24 * 60 * 60.0,
Duration'Last);
-- Max of half a year delay, needed to prevent exceptions for large delay
-- values. It seems unlikely that any test will notice this restriction,
-- except in the case of applications setting the clock at run time (see
-- s-tastim.adb). Also note that a larger value might cause problems (e.g
-- overflow, or more likely OS limitation in the primitives used). In the
-- case where half a year is too long (which occurs in high integrity mode
-- with 32-bit words, and possibly on some specific ports of GNAT),
-- Duration'Last is used instead.
procedure Initialize;
-- Initialize global settings related to this package. This procedure
-- should be called before any other subprograms in this package. Note
-- that this procedure can be called several times.
function Clock return Duration;
pragma Inline (Clock);
-- Returns "absolute" time, represented as an offset relative to "the
-- Epoch", which is Jan 1, 1970 00:00:00 UTC on UNIX systems. This
-- implementation is affected by system's clock changes.
Relative : constant := 0;
Absolute_Calendar : constant := 1;
Absolute_RT : constant := 2;
-- Values for Mode call below. Note that the compiler (exp_ch9.adb) relies
-- on these values. So any change here must be reflected in corresponding
-- changes in the compiler.
procedure Timed_Delay (Time : Duration; Mode : Integer);
-- Implements the semantics of the delay statement when no tasking is used
-- in the application.
--
-- Mode is one of the three values above
--
-- Time is a relative or absolute duration value, depending on Mode.
--
-- Note that currently Ada.Real_Time always uses the tasking run time,
-- so this procedure should never be called with Mode set to Absolute_RT.
-- This may change in future or bare board implementations.
end System.OS_Primitives;
| 56.325581 | 78 | 0.535301 |
38cb0e983181a669656a94f27698a28c72890456 | 4,084 | ads | Ada | source/nodes/program-nodes-record_types.ads | optikos/oasis | 9f64d46d26d964790d69f9db681c874cfb3bf96d | [
"MIT"
] | null | null | null | source/nodes/program-nodes-record_types.ads | optikos/oasis | 9f64d46d26d964790d69f9db681c874cfb3bf96d | [
"MIT"
] | null | null | null | source/nodes/program-nodes-record_types.ads | optikos/oasis | 9f64d46d26d964790d69f9db681c874cfb3bf96d | [
"MIT"
] | 2 | 2019-09-14T23:18:50.000Z | 2019-10-02T10:11:40.000Z | -- Copyright (c) 2019 Maxim Reznik <[email protected]>
--
-- SPDX-License-Identifier: MIT
-- License-Filename: LICENSE
-------------------------------------------------------------
with Program.Lexical_Elements;
with Program.Elements.Definitions;
with Program.Elements.Record_Types;
with Program.Element_Visitors;
package Program.Nodes.Record_Types is
pragma Preelaborate;
type Record_Type is
new Program.Nodes.Node and Program.Elements.Record_Types.Record_Type
and Program.Elements.Record_Types.Record_Type_Text
with private;
function Create
(Abstract_Token : not null Program.Lexical_Elements
.Lexical_Element_Access;
Tagged_Token : not null Program.Lexical_Elements
.Lexical_Element_Access;
Limited_Token : not null Program.Lexical_Elements
.Lexical_Element_Access;
Record_Definition : not null Program.Elements.Definitions
.Definition_Access)
return Record_Type;
type Implicit_Record_Type is
new Program.Nodes.Node and Program.Elements.Record_Types.Record_Type
with private;
function Create
(Record_Definition : not null Program.Elements.Definitions
.Definition_Access;
Is_Part_Of_Implicit : Boolean := False;
Is_Part_Of_Inherited : Boolean := False;
Is_Part_Of_Instance : Boolean := False)
return Implicit_Record_Type
with Pre =>
Is_Part_Of_Implicit or Is_Part_Of_Inherited or Is_Part_Of_Instance;
private
type Base_Record_Type is
abstract new Program.Nodes.Node
and Program.Elements.Record_Types.Record_Type
with record
Record_Definition : not null Program.Elements.Definitions
.Definition_Access;
end record;
procedure Initialize (Self : aliased in out Base_Record_Type'Class);
overriding procedure Visit
(Self : not null access Base_Record_Type;
Visitor : in out Program.Element_Visitors.Element_Visitor'Class);
overriding function Record_Definition
(Self : Base_Record_Type)
return not null Program.Elements.Definitions.Definition_Access;
overriding function Is_Record_Type_Element
(Self : Base_Record_Type)
return Boolean;
overriding function Is_Type_Definition_Element
(Self : Base_Record_Type)
return Boolean;
overriding function Is_Definition_Element
(Self : Base_Record_Type)
return Boolean;
type Record_Type is
new Base_Record_Type and Program.Elements.Record_Types.Record_Type_Text
with record
Abstract_Token : not null Program.Lexical_Elements
.Lexical_Element_Access;
Tagged_Token : not null Program.Lexical_Elements
.Lexical_Element_Access;
Limited_Token : not null Program.Lexical_Elements
.Lexical_Element_Access;
end record;
overriding function To_Record_Type_Text
(Self : aliased in out Record_Type)
return Program.Elements.Record_Types.Record_Type_Text_Access;
overriding function Abstract_Token
(Self : Record_Type)
return not null Program.Lexical_Elements.Lexical_Element_Access;
overriding function Tagged_Token
(Self : Record_Type)
return not null Program.Lexical_Elements.Lexical_Element_Access;
overriding function Limited_Token
(Self : Record_Type)
return not null Program.Lexical_Elements.Lexical_Element_Access;
type Implicit_Record_Type is
new Base_Record_Type
with record
Is_Part_Of_Implicit : Boolean;
Is_Part_Of_Inherited : Boolean;
Is_Part_Of_Instance : Boolean;
end record;
overriding function To_Record_Type_Text
(Self : aliased in out Implicit_Record_Type)
return Program.Elements.Record_Types.Record_Type_Text_Access;
overriding function Is_Part_Of_Implicit
(Self : Implicit_Record_Type)
return Boolean;
overriding function Is_Part_Of_Inherited
(Self : Implicit_Record_Type)
return Boolean;
overriding function Is_Part_Of_Instance
(Self : Implicit_Record_Type)
return Boolean;
end Program.Nodes.Record_Types;
| 31.658915 | 76 | 0.729922 |
3869f240ce866ea057c2321821b80be1759370ed | 3,000 | ads | Ada | src/Command_Line/line_parsers-receivers.ads | fintatarta/eugen | 2c384838ff0e81b51172310ce5d0e47d71ffd4fd | [
"MIT"
] | null | null | null | src/Command_Line/line_parsers-receivers.ads | fintatarta/eugen | 2c384838ff0e81b51172310ce5d0e47d71ffd4fd | [
"MIT"
] | null | null | null | src/Command_Line/line_parsers-receivers.ads | fintatarta/eugen | 2c384838ff0e81b51172310ce5d0e47d71ffd4fd | [
"MIT"
] | null | null | null | --
-- This package provides few handlers for common types: strings,
-- integers and float. A separate package provides a generic
-- handler for enumerative types.
--
package Line_Parsers.Receivers is
type String_Receiver is new Abstract_Parameter_Handler with private;
overriding
function Is_Set(Handler: String_Receiver) return Boolean;
overriding
procedure Receive (Handler : in out String_Receiver;
Name : String;
Value : String;
Position : Natural);
overriding
function Reusable(Handler: String_Receiver) return Boolean;
function Value (Handler : String_Receiver) return String
with Pre => Handler.Is_Set;
type Integer_Receiver is new Abstract_Parameter_Handler with private;
overriding
function Is_Set (Handler : integer_Receiver) return Boolean;
overriding
procedure Receive (Handler : in out Integer_Receiver;
Name : String;
Value : String;
Position : Natural);
overriding
function Reusable (Handler : Integer_Receiver) return Boolean;
function Get (Handler : Integer_Receiver) return Integer
with Pre => Handler.Is_Set;
type Float_Receiver is new Abstract_Parameter_Handler with private;
overriding
function Is_Set (Handler : Float_Receiver) return Boolean;
procedure Receive (Handler : in out Float_Receiver;
Name : String;
Value : String;
Position : Natural);
function Get (Handler : Float_Receiver) return Float
with Pre => Handler.Is_Set;
overriding
function Reusable(Handler: Float_Receiver) return Boolean;
private
type String_Receiver is new Abstract_Parameter_Handler with
record
Set : Boolean := False;
Value : Unbounded_String;
end record;
function Is_Set (Handler : String_Receiver) return Boolean
is (Handler.Set);
function Value (Handler : String_Receiver) return String
is (To_String (Handler.Value));
function Reusable(Handler: String_Receiver) return Boolean
is (False);
type Integer_Receiver is new Abstract_Parameter_Handler with
record
Set : Boolean := False;
Value : Integer;
end record;
function Is_Set (Handler : Integer_Receiver) return Boolean
is (Handler.Set);
function Get (Handler : Integer_Receiver) return Integer
is (Handler.Value);
function Reusable(Handler: Integer_Receiver) return Boolean
is (False);
type Float_Receiver is new Abstract_Parameter_Handler with
record
Set : Boolean := False;
Value : Float;
end record;
function Is_Set (Handler : Float_Receiver) return Boolean
is (Handler.Set);
function Get (Handler : Float_Receiver) return Float
is (Handler.Value);
function Reusable(Handler: Float_Receiver) return Boolean
is (False);
end Line_Parsers.Receivers;
| 28.037383 | 72 | 0.674333 |
4bf12e6a85cc923ad3b26aa6fb87d22dcf8a089d | 22,756 | ads | Ada | llvm-gcc-4.2-2.9/gcc/ada/namet.ads | vidkidz/crossbridge | ba0bf94aee0ce6cf7eb5be882382e52bc57ba396 | [
"MIT"
] | 1 | 2016-04-09T02:58:13.000Z | 2016-04-09T02:58:13.000Z | llvm-gcc-4.2-2.9/gcc/ada/namet.ads | vidkidz/crossbridge | ba0bf94aee0ce6cf7eb5be882382e52bc57ba396 | [
"MIT"
] | null | null | null | llvm-gcc-4.2-2.9/gcc/ada/namet.ads | vidkidz/crossbridge | ba0bf94aee0ce6cf7eb5be882382e52bc57ba396 | [
"MIT"
] | null | null | null | ------------------------------------------------------------------------------
-- --
-- GNAT COMPILER COMPONENTS --
-- --
-- N A M E T --
-- --
-- S p e c --
-- --
-- Copyright (C) 1992-2005 Free Software Foundation, Inc. --
-- --
-- GNAT is free software; you can redistribute it and/or modify it under --
-- terms of the GNU General Public License as published by the Free Soft- --
-- ware Foundation; either version 2, or (at your option) any later ver- --
-- sion. GNAT is distributed in the hope that it will be useful, but WITH- --
-- OUT ANY WARRANTY; without even the implied warranty of MERCHANTABILITY --
-- or FITNESS FOR A PARTICULAR PURPOSE. See the GNU General Public License --
-- for more details. You should have received a copy of the GNU General --
-- Public License distributed with GNAT; see file COPYING. If not, write --
-- to the Free Software Foundation, 51 Franklin Street, Fifth Floor, --
-- Boston, MA 02110-1301, USA. --
-- --
-- As a special exception, if other files instantiate generics from this --
-- unit, or you link this unit with other files to produce an executable, --
-- this unit does not by itself cause the resulting executable to be --
-- covered by the GNU General Public License. This exception does not --
-- however invalidate any other reasons why the executable file might be --
-- covered by the GNU Public License. --
-- --
-- GNAT was originally developed by the GNAT team at New York University. --
-- Extensive contributions were provided by Ada Core Technologies Inc. --
-- --
------------------------------------------------------------------------------
with Alloc;
with Table;
with Hostparm; use Hostparm;
with System; use System;
with Types; use Types;
package Namet is
-- WARNING: There is a C version of this package. Any changes to this
-- source file must be properly reflected in the C header file namet.h
-- which is created manually from namet.ads and namet.adb.
-- This package contains routines for handling the names table. The table
-- is used to store character strings for identifiers and operator symbols,
-- as well as other string values such as unit names and file names.
-- The forms of the entries are as follows:
-- Identifiers Stored with upper case letters folded to lower case. Upper
-- half (16#80# bit set) and wide characters are stored
-- in an encoded form (Uhh for upper half char, Whhhh
-- for wide characters, WWhhhhhhhh as provided by the
-- routine Store_Encoded_Character, where hh are hex
-- digits for the character code using lower case a-f).
-- Normally the use of U or W in other internal names is
-- avoided, but these letters may be used in internal
-- names (without this special meaning), if they appear
-- as the last character of the name, or they are
-- followed by an upper case letter (other than the WW
-- sequence), or an underscore.
-- Operator symbols Stored with an initial letter O, and the remainder
-- of the name is the lower case characters XXX where
-- the name is Name_Op_XXX, see Snames spec for a full
-- list of the operator names. Normally the use of O
-- in other internal names is avoided, but it may be
-- used in internal names (without this special meaning)
-- if it is the last character of the name, or if it is
-- followed by an upper case letter or an underscore.
-- Character literals Character literals have names that are used only for
-- debugging and error message purposes. The form is a
-- upper case Q followed by a single lower case letter,
-- or by a Uxx/Wxxxx/WWxxxxxxx encoding as described for
-- identifiers. The Set_Character_Literal_Name procedure
-- should be used to construct these encodings. Normally
-- the use of O in other internal names is avoided, but
-- it may be used in internal names (without this special
-- meaning) if it is the last character of the name, or
-- if it is followed by an upper case letter or an
-- underscore.
-- Unit names Stored with upper case letters folded to lower case,
-- using Uhh/Whhhh/WWhhhhhhhh encoding as described for
-- identifiers, and a %s or %b suffix for specs/bodies.
-- See package Uname for further details.
-- File names Are stored in the form provided by Osint. Typically
-- they may include wide character escape sequences and
-- upper case characters (in non-encoded form). Casing
-- is also derived from the external environment. Note
-- that file names provided by Osint must generally be
-- consistent with the names from Fname.Get_File_Name.
-- Other strings The names table is also used as a convenient storage
-- location for other variable length strings such as
-- error messages etc. There are no restrictions on what
-- characters may appear for such entries.
-- Note: the encodings Uhh (upper half characters), Whhhh (wide characters),
-- WWhhhhhhhh (wide wide characters) and Qx (character literal names) are
-- described in the spec, since they are visible throughout the system (e.g.
-- in debugging output). However, no code should depend on these particular
-- encodings, so it should be possible to change the encodings by making
-- changes only to the Namet specification (to change these comments) and the
-- body (which actually implements the encodings).
-- The names are hashed so that a given name appears only once in the table,
-- except that names entered with Name_Enter as opposed to Name_Find are
-- omitted from the hash table.
-- The first 26 entries in the names table (with Name_Id values in the range
-- First_Name_Id .. First_Name_Id + 25) represent names which are the one
-- character lower case letters in the range a-z, and these names are created
-- and initialized by the Initialize procedure.
-- Two values, one of type Int and one of type Byte, are stored with each
-- names table entry and subprograms are provided for setting and retrieving
-- these associated values. The usage of these values is up to the client. In
-- the compiler, the Int field is used to point to a chain of potentially
-- visible entities (see Sem.Ch8 for details), and the Byte field is used to
-- hold the Token_Type value for reserved words (see Sem for details). In the
-- binder, the Byte field is unused, and the Int field is used in various
-- ways depending on the name involved (see binder documentation).
Name_Buffer : String (1 .. 4 * Max_Line_Length);
-- This buffer is used to set the name to be stored in the table for the
-- Name_Find call, and to retrieve the name for the Get_Name_String call.
-- The limit here is intended to be an infinite value that ensures that we
-- never overflow the buffer (names this long are too absurd to worry!)
Name_Len : Natural;
-- Length of name stored in Name_Buffer. Used as an input parameter for
-- Name_Find, and as an output value by Get_Name_String, or Write_Name.
-----------------
-- Subprograms --
-----------------
procedure Finalize;
-- Called at the end of a use of the Namet package (before a subsequent
-- call to Initialize). Currently this routine is only used to generate
-- debugging output.
procedure Get_Name_String (Id : Name_Id);
-- Get_Name_String is used to retrieve the string associated with an entry
-- in the names table. The resulting string is stored in Name_Buffer and
-- Name_Len is set. It is an error to call Get_Name_String with one of the
-- special name Id values (No_Name or Error_Name).
function Get_Name_String (Id : Name_Id) return String;
-- This functional form returns the result as a string without affecting
-- the contents of either Name_Buffer or Name_Len.
procedure Get_Unqualified_Name_String (Id : Name_Id);
-- Similar to the above except that qualification (as defined in unit
-- Exp_Dbug) is removed (including both preceding __ delimited names, and
-- also the suffixes used to indicate package body entities and to
-- distinguish between overloaded entities). Note that names are not
-- qualified until just before the call to gigi, so this routine is only
-- needed by processing that occurs after gigi has been called. This
-- includes all ASIS processing, since ASIS works on the tree written
-- after gigi has been called.
procedure Get_Name_String_And_Append (Id : Name_Id);
-- Like Get_Name_String but the resulting characters are appended to the
-- current contents of the entry stored in Name_Buffer, and Name_Len is
-- incremented to include the added characters.
procedure Get_Decoded_Name_String (Id : Name_Id);
-- Same calling sequence an interface as Get_Name_String, except that the
-- result is decoded, so that upper half characters and wide characters
-- appear as originally found in the source program text, operators have
-- their source forms (special characters and enclosed in quotes), and
-- character literals appear surrounded by apostrophes.
procedure Get_Unqualified_Decoded_Name_String (Id : Name_Id);
-- Similar to the above except that qualification (as defined in unit
-- Exp_Dbug) is removed (including both preceding __ delimited names, and
-- also the suffix used to indicate package body entities). Note that
-- names are not qualified until just before the call to gigi, so this
-- routine is only needed by processing that occurs after gigi has been
-- called. This includes all ASIS processing, since ASIS works on the tree
-- written after gigi has been called.
procedure Get_Decoded_Name_String_With_Brackets (Id : Name_Id);
-- This routine is similar to Decoded_Name, except that the brackets
-- notation (Uhh replaced by ["hh"], Whhhh replaced by ["hhhh"],
-- WWhhhhhhhh replaced by ["hhhhhhhh"]) is used for all non-lower half
-- characters, regardless of how Opt.Wide_Character_Encoding_Method is
-- set, and also in that characters in the range 16#80# .. 16#FF# are
-- converted to brackets notation in all cases. This routine can be used
-- when there is a requirement for a canonical representation not affected
-- by the character set options (e.g. in the binder generation of
-- symbols).
function Get_Name_Table_Byte (Id : Name_Id) return Byte;
pragma Inline (Get_Name_Table_Byte);
-- Fetches the Byte value associated with the given name
function Get_Name_Table_Info (Id : Name_Id) return Int;
pragma Inline (Get_Name_Table_Info);
-- Fetches the Int value associated with the given name
function Is_Operator_Name (Id : Name_Id) return Boolean;
-- Returns True if name given is of the form of an operator (that
-- is, it starts with an upper case O).
procedure Initialize;
-- Initializes the names table, including initializing the first 26
-- entries in the table (for the 1-character lower case names a-z) Note
-- that Initialize must not be called if Tree_Read is used.
procedure Lock;
-- Lock name table before calling back end. Space for up to 10 extra
-- names and 1000 extra characters is reserved before the table is locked.
procedure Unlock;
-- Unlocks the name table to allow use of the 10 extra names and 1000
-- extra characters reserved by the Lock call. See gnat1drv for details of
-- the need for this.
function Length_Of_Name (Id : Name_Id) return Nat;
pragma Inline (Length_Of_Name);
-- Returns length of given name in characters. This is the length of the
-- encoded name, as stored in the names table, the result is equivalent to
-- calling Get_Name_String and reading Name_Len, except that a call to
-- Length_Of_Name does not affect the contents of Name_Len and Name_Buffer.
function Name_Chars_Address return System.Address;
-- Return starting address of name characters table (used in Back_End call
-- to Gigi).
function Name_Find return Name_Id;
-- Name_Find is called with a string stored in Name_Buffer whose length is
-- in Name_Len (i.e. the characters of the name are in subscript positions
-- 1 to Name_Len in Name_Buffer). It searches the names table to see if
-- the string has already been stored. If so the Id of the existing entry
-- is returned. Otherwise a new entry is created with its Name_Table_Info
-- field set to zero. The contents of Name_Buffer and Name_Len are not
-- modified by this call. Note that it is permissible for Name_Len to be
-- set to zero to lookup the null name string.
function Name_Enter return Name_Id;
-- Name_Enter has the same calling interface as Name_Find. The difference
-- is that it does not search the table for an existing match, and also
-- subsequent Name_Find calls using the same name will not locate the
-- entry created by this call. Thus multiple calls to Name_Enter with the
-- same name will create multiple entries in the name table with different
-- Name_Id values. This is useful in the case of created names, which are
-- never expected to be looked up. Note: Name_Enter should never be used
-- for one character names, since these are efficiently located without
-- hashing by Name_Find in any case.
function Name_Entries_Address return System.Address;
-- Return starting address of Names table (used in Back_End call to Gigi)
function Name_Entries_Count return Nat;
-- Return current number of entries in the names table
function Is_OK_Internal_Letter (C : Character) return Boolean;
pragma Inline (Is_OK_Internal_Letter);
-- Returns true if C is a suitable character for using as a prefix or a
-- suffix of an internally generated name, i.e. it is an upper case letter
-- other than one of the ones used for encoding source names (currently
-- the set of reserved letters is O, Q, U, W) and also returns False for
-- the letter X, which is reserved for debug output (see Exp_Dbug).
function Is_Internal_Name (Id : Name_Id) return Boolean;
-- Returns True if the name is an internal name (i.e. contains a character
-- for which Is_OK_Internal_Letter is true, or if the name starts or ends
-- with an underscore. This call destroys the value of Name_Len and
-- Name_Buffer (it loads these as for Get_Name_String).
--
-- Note: if the name is qualified (has a double underscore), then only the
-- final entity name is considered, not the qualifying names. Consider for
-- example that the name:
--
-- pkg__B_1__xyz
--
-- is not an internal name, because the B comes from the internal name of
-- a qualifying block, but the xyz means that this was indeed a declared
-- identifier called "xyz" within this block and there is nothing internal
-- about that name.
function Is_Internal_Name return Boolean;
-- Like the form with an Id argument, except that the name to be tested is
-- passed in Name_Buffer and Name_Len (which are not affected by the call).
-- Name_Buffer (it loads these as for Get_Name_String).
procedure Reset_Name_Table;
-- This procedure is used when there are multiple source files to reset
-- the name table info entries associated with current entries in the
-- names table. There is no harm in keeping the names entries themselves
-- from one compilation to another, but we can't keep the entity info,
-- since this refers to tree nodes, which are destroyed between each main
-- source file.
procedure Add_Char_To_Name_Buffer (C : Character);
pragma Inline (Add_Char_To_Name_Buffer);
-- Add given character to the end of the string currently stored in the
-- Name_Buffer, incrementing Name_Len.
procedure Add_Nat_To_Name_Buffer (V : Nat);
-- Add decimal representation of given value to the end of the string
-- currently stored in Name_Buffer, incrementing Name_Len as required.
procedure Add_Str_To_Name_Buffer (S : String);
-- Add characters of string S to the end of the string currently stored
-- in the Name_Buffer, incrementing Name_Len by the length of the string.
procedure Set_Character_Literal_Name (C : Char_Code);
-- This procedure sets the proper encoded name for the character literal
-- for the given character code. On return Name_Buffer and Name_Len are
-- set to reflect the stored name.
procedure Set_Name_Table_Info (Id : Name_Id; Val : Int);
pragma Inline (Set_Name_Table_Info);
-- Sets the Int value associated with the given name
procedure Set_Name_Table_Byte (Id : Name_Id; Val : Byte);
pragma Inline (Set_Name_Table_Byte);
-- Sets the Byte value associated with the given name
procedure Store_Encoded_Character (C : Char_Code);
-- Stores given character code at the end of Name_Buffer, updating the
-- value in Name_Len appropriately. Lower case letters and digits are
-- stored unchanged. Other 8-bit characters are stored using the Uhh
-- encoding (hh = hex code), other 16-bit wide character values are stored
-- using the Whhhh (hhhh = hex code) encoding, and other 32-bit wide wide
-- character values are stored using the WWhhhhhhhh (hhhhhhhh = hex code).
-- Note that this procedure does not fold upper case letters (they are
-- stored using the Uhh encoding). If folding is required, it must be done
-- by the caller prior to the call.
procedure Tree_Read;
-- Initializes internal tables from current tree file using the relevant
-- Table.Tree_Read routines. Note that Initialize should not be called if
-- Tree_Read is used. Tree_Read includes all necessary initialization.
procedure Tree_Write;
-- Writes out internal tables to current tree file using the relevant
-- Table.Tree_Write routines.
procedure Get_Last_Two_Chars (N : Name_Id; C1, C2 : out Character);
-- Obtains last two characters of a name. C1 is last but one character
-- and C2 is last character. If name is less than two characters long,
-- then both C1 and C2 are set to ASCII.NUL on return.
procedure Write_Name (Id : Name_Id);
-- Write_Name writes the characters of the specified name using the
-- standard output procedures in package Output. No end of line is
-- written, just the characters of the name. On return Name_Buffer and
-- Name_Len are set as for a call to Get_Name_String. The name is written
-- in encoded form (i.e. including Uhh, Whhh, Qx, _op as they appear in
-- the name table). If Id is Error_Name, or No_Name, no text is output.
procedure wn (Id : Name_Id);
pragma Export (Ada, wn);
-- Like Write_Name, but includes new line at end. Intended for use
-- from the debugger only.
procedure Write_Name_Decoded (Id : Name_Id);
-- Like Write_Name, except that the name written is the decoded name, as
-- described for Get_Decoded_Name_String, and the resulting value stored
-- in Name_Len and Name_Buffer is the decoded name.
---------------------------
-- Table Data Structures --
---------------------------
-- The following declarations define the data structures used to store
-- names. The definitions are in the private part of the package spec,
-- rather than the body, since they are referenced directly by gigi.
private
-- This table stores the actual string names. Although logically there is
-- no need for a terminating character (since the length is stored in the
-- name entry table), we still store a NUL character at the end of every
-- name (for convenience in interfacing to the C world).
package Name_Chars is new Table.Table (
Table_Component_Type => Character,
Table_Index_Type => Int,
Table_Low_Bound => 0,
Table_Initial => Alloc.Name_Chars_Initial,
Table_Increment => Alloc.Name_Chars_Increment,
Table_Name => "Name_Chars");
type Name_Entry is record
Name_Chars_Index : Int;
-- Starting location of characters in the Name_Chars table minus one
-- (i.e. pointer to character just before first character). The reason
-- for the bias of one is that indexes in Name_Buffer are one's origin,
-- so this avoids unnecessary adds and subtracts of 1.
Name_Len : Short;
-- Length of this name in characters
Byte_Info : Byte;
-- Byte value associated with this name
Hash_Link : Name_Id;
-- Link to next entry in names table for same hash code
Int_Info : Int;
-- Int Value associated with this name
end record;
-- This is the table that is referenced by Name_Id entries.
-- It contains one entry for each unique name in the table.
package Name_Entries is new Table.Table (
Table_Component_Type => Name_Entry,
Table_Index_Type => Name_Id,
Table_Low_Bound => First_Name_Id,
Table_Initial => Alloc.Names_Initial,
Table_Increment => Alloc.Names_Increment,
Table_Name => "Name_Entries");
end Namet;
| 53.41784 | 79 | 0.660925 |
38bb3371118c174a81067dc2d84641c64f59867c | 18,123 | ads | Ada | arch/ARM/STM32/svd/stm32l4x1/stm32_svd-sdio.ads | morbos/Ada_Drivers_Library | a4ab26799be60997c38735f4056160c4af597ef7 | [
"BSD-3-Clause"
] | 2 | 2018-05-16T03:56:39.000Z | 2019-07-31T13:53:56.000Z | arch/ARM/STM32/svd/stm32l4x1/stm32_svd-sdio.ads | morbos/Ada_Drivers_Library | a4ab26799be60997c38735f4056160c4af597ef7 | [
"BSD-3-Clause"
] | null | null | null | arch/ARM/STM32/svd/stm32l4x1/stm32_svd-sdio.ads | morbos/Ada_Drivers_Library | a4ab26799be60997c38735f4056160c4af597ef7 | [
"BSD-3-Clause"
] | null | null | null | -- This spec has been automatically generated from STM32L4x1.svd
pragma Restrictions (No_Elaboration_Code);
pragma Ada_2012;
pragma Style_Checks (Off);
with HAL;
with System;
package STM32_SVD.SDIO is
pragma Preelaborate;
---------------
-- Registers --
---------------
subtype POWER_PWRCTRL_Field is HAL.UInt2;
-- power control register
type POWER_Register is record
-- PWRCTRL
PWRCTRL : POWER_PWRCTRL_Field := 16#0#;
-- unspecified
Reserved_2_31 : HAL.UInt30 := 16#0#;
end record
with Volatile_Full_Access, Size => 32,
Bit_Order => System.Low_Order_First;
for POWER_Register use record
PWRCTRL at 0 range 0 .. 1;
Reserved_2_31 at 0 range 2 .. 31;
end record;
subtype CLKCR_CLKDIV_Field is HAL.UInt8;
subtype CLKCR_WIDBUS_Field is HAL.UInt2;
-- SDI clock control register
type CLKCR_Register is record
-- Clock divide factor
CLKDIV : CLKCR_CLKDIV_Field := 16#0#;
-- Clock enable bit
CLKEN : Boolean := False;
-- Power saving configuration bit
PWRSAV : Boolean := False;
-- Clock divider bypass enable bit
BYPASS : Boolean := False;
-- Wide bus mode enable bit
WIDBUS : CLKCR_WIDBUS_Field := 16#0#;
-- SDIO_CK dephasing selection bit
NEGEDGE : Boolean := False;
-- HW Flow Control enable
HWFC_EN : Boolean := False;
-- unspecified
Reserved_15_31 : HAL.UInt17 := 16#0#;
end record
with Volatile_Full_Access, Size => 32,
Bit_Order => System.Low_Order_First;
for CLKCR_Register use record
CLKDIV at 0 range 0 .. 7;
CLKEN at 0 range 8 .. 8;
PWRSAV at 0 range 9 .. 9;
BYPASS at 0 range 10 .. 10;
WIDBUS at 0 range 11 .. 12;
NEGEDGE at 0 range 13 .. 13;
HWFC_EN at 0 range 14 .. 14;
Reserved_15_31 at 0 range 15 .. 31;
end record;
subtype CMD_CMDINDEX_Field is HAL.UInt6;
subtype CMD_WAITRESP_Field is HAL.UInt2;
-- command register
type CMD_Register is record
-- Command index
CMDINDEX : CMD_CMDINDEX_Field := 16#0#;
-- Wait for response bits
WAITRESP : CMD_WAITRESP_Field := 16#0#;
-- CPSM waits for interrupt request
WAITINT : Boolean := False;
-- CPSM Waits for ends of data transfer (CmdPend internal signal)
WAITPEND : Boolean := False;
-- Command path state machine (CPSM) Enable bit
CPSMEN : Boolean := False;
-- SD I/O suspend command
SDIOSuspend : Boolean := False;
-- Enable CMD completion
ENCMDcompl : Boolean := False;
-- not Interrupt Enable
nIEN : Boolean := False;
-- CE-ATA command
CE_ATACMD : Boolean := False;
-- unspecified
Reserved_15_31 : HAL.UInt17 := 16#0#;
end record
with Volatile_Full_Access, Size => 32,
Bit_Order => System.Low_Order_First;
for CMD_Register use record
CMDINDEX at 0 range 0 .. 5;
WAITRESP at 0 range 6 .. 7;
WAITINT at 0 range 8 .. 8;
WAITPEND at 0 range 9 .. 9;
CPSMEN at 0 range 10 .. 10;
SDIOSuspend at 0 range 11 .. 11;
ENCMDcompl at 0 range 12 .. 12;
nIEN at 0 range 13 .. 13;
CE_ATACMD at 0 range 14 .. 14;
Reserved_15_31 at 0 range 15 .. 31;
end record;
subtype RESPCMD_RESPCMD_Field is HAL.UInt6;
-- command response register
type RESPCMD_Register is record
-- Read-only. Response command index
RESPCMD : RESPCMD_RESPCMD_Field;
-- unspecified
Reserved_6_31 : HAL.UInt26;
end record
with Volatile_Full_Access, Size => 32,
Bit_Order => System.Low_Order_First;
for RESPCMD_Register use record
RESPCMD at 0 range 0 .. 5;
Reserved_6_31 at 0 range 6 .. 31;
end record;
subtype DLEN_DATALENGTH_Field is HAL.UInt25;
-- data length register
type DLEN_Register is record
-- Data length value
DATALENGTH : DLEN_DATALENGTH_Field := 16#0#;
-- unspecified
Reserved_25_31 : HAL.UInt7 := 16#0#;
end record
with Volatile_Full_Access, Size => 32,
Bit_Order => System.Low_Order_First;
for DLEN_Register use record
DATALENGTH at 0 range 0 .. 24;
Reserved_25_31 at 0 range 25 .. 31;
end record;
subtype DCTRL_DBLOCKSIZE_Field is HAL.UInt4;
-- data control register
type DCTRL_Register is record
-- DTEN
DTEN : Boolean := False;
-- Data transfer direction selection
DTDIR : Boolean := False;
-- Data transfer mode selection 1: Stream or SDIO multibyte data
-- transfer
DTMODE : Boolean := False;
-- DMA enable bit
DMAEN : Boolean := False;
-- Data block size
DBLOCKSIZE : DCTRL_DBLOCKSIZE_Field := 16#0#;
-- Read wait start
RWSTART : Boolean := False;
-- Read wait stop
RWSTOP : Boolean := False;
-- Read wait mode
RWMOD : Boolean := False;
-- SD I/O enable functions
SDIOEN : Boolean := False;
-- unspecified
Reserved_12_31 : HAL.UInt20 := 16#0#;
end record
with Volatile_Full_Access, Size => 32,
Bit_Order => System.Low_Order_First;
for DCTRL_Register use record
DTEN at 0 range 0 .. 0;
DTDIR at 0 range 1 .. 1;
DTMODE at 0 range 2 .. 2;
DMAEN at 0 range 3 .. 3;
DBLOCKSIZE at 0 range 4 .. 7;
RWSTART at 0 range 8 .. 8;
RWSTOP at 0 range 9 .. 9;
RWMOD at 0 range 10 .. 10;
SDIOEN at 0 range 11 .. 11;
Reserved_12_31 at 0 range 12 .. 31;
end record;
subtype DCOUNT_DATACOUNT_Field is HAL.UInt25;
-- data counter register
type DCOUNT_Register is record
-- Read-only. Data count value
DATACOUNT : DCOUNT_DATACOUNT_Field;
-- unspecified
Reserved_25_31 : HAL.UInt7;
end record
with Volatile_Full_Access, Size => 32,
Bit_Order => System.Low_Order_First;
for DCOUNT_Register use record
DATACOUNT at 0 range 0 .. 24;
Reserved_25_31 at 0 range 25 .. 31;
end record;
-- status register
type STA_Register is record
-- Read-only. Command response received (CRC check failed)
CCRCFAIL : Boolean;
-- Read-only. Data block sent/received (CRC check failed)
DCRCFAIL : Boolean;
-- Read-only. Command response timeout
CTIMEOUT : Boolean;
-- Read-only. Data timeout
DTIMEOUT : Boolean;
-- Read-only. Transmit FIFO underrun error
TXUNDERR : Boolean;
-- Read-only. Received FIFO overrun error
RXOVERR : Boolean;
-- Read-only. Command response received (CRC check passed)
CMDREND : Boolean;
-- Read-only. Command sent (no response required)
CMDSENT : Boolean;
-- Read-only. Data end (data counter, SDIDCOUNT, is zero)
DATAEND : Boolean;
-- Read-only. Start bit not detected on all data signals in wide bus
-- mode
STBITERR : Boolean;
-- Read-only. Data block sent/received (CRC check passed)
DBCKEND : Boolean;
-- Read-only. Command transfer in progress
CMDACT : Boolean;
-- Read-only. Data transmit in progress
TXACT : Boolean;
-- Read-only. Data receive in progress
RXACT : Boolean;
-- Read-only. Transmit FIFO half empty: at least 8 words can be written
-- into the FIFO
TXFIFOHE : Boolean;
-- Read-only. Receive FIFO half full: there are at least 8 words in the
-- FIFO
RXFIFOHF : Boolean;
-- Read-only. Transmit FIFO full
TXFIFOF : Boolean;
-- Read-only. Receive FIFO full
RXFIFOF : Boolean;
-- Read-only. Transmit FIFO empty
TXFIFOE : Boolean;
-- Read-only. Receive FIFO empty
RXFIFOE : Boolean;
-- Read-only. Data available in transmit FIFO
TXDAVL : Boolean;
-- Read-only. Data available in receive FIFO
RXDAVL : Boolean;
-- Read-only. SDIO interrupt received
SDIOIT : Boolean;
-- Read-only. CE-ATA command completion signal received for CMD61
CEATAEND : Boolean;
-- unspecified
Reserved_24_31 : HAL.UInt8;
end record
with Volatile_Full_Access, Size => 32,
Bit_Order => System.Low_Order_First;
for STA_Register use record
CCRCFAIL at 0 range 0 .. 0;
DCRCFAIL at 0 range 1 .. 1;
CTIMEOUT at 0 range 2 .. 2;
DTIMEOUT at 0 range 3 .. 3;
TXUNDERR at 0 range 4 .. 4;
RXOVERR at 0 range 5 .. 5;
CMDREND at 0 range 6 .. 6;
CMDSENT at 0 range 7 .. 7;
DATAEND at 0 range 8 .. 8;
STBITERR at 0 range 9 .. 9;
DBCKEND at 0 range 10 .. 10;
CMDACT at 0 range 11 .. 11;
TXACT at 0 range 12 .. 12;
RXACT at 0 range 13 .. 13;
TXFIFOHE at 0 range 14 .. 14;
RXFIFOHF at 0 range 15 .. 15;
TXFIFOF at 0 range 16 .. 16;
RXFIFOF at 0 range 17 .. 17;
TXFIFOE at 0 range 18 .. 18;
RXFIFOE at 0 range 19 .. 19;
TXDAVL at 0 range 20 .. 20;
RXDAVL at 0 range 21 .. 21;
SDIOIT at 0 range 22 .. 22;
CEATAEND at 0 range 23 .. 23;
Reserved_24_31 at 0 range 24 .. 31;
end record;
-- interrupt clear register
type ICR_Register is record
-- CCRCFAIL flag clear bit
CCRCFAILC : Boolean := False;
-- DCRCFAIL flag clear bit
DCRCFAILC : Boolean := False;
-- CTIMEOUT flag clear bit
CTIMEOUTC : Boolean := False;
-- DTIMEOUT flag clear bit
DTIMEOUTC : Boolean := False;
-- TXUNDERR flag clear bit
TXUNDERRC : Boolean := False;
-- RXOVERR flag clear bit
RXOVERRC : Boolean := False;
-- CMDREND flag clear bit
CMDRENDC : Boolean := False;
-- CMDSENT flag clear bit
CMDSENTC : Boolean := False;
-- DATAEND flag clear bit
DATAENDC : Boolean := False;
-- STBITERR flag clear bit
STBITERRC : Boolean := False;
-- DBCKEND flag clear bit
DBCKENDC : Boolean := False;
-- unspecified
Reserved_11_21 : HAL.UInt11 := 16#0#;
-- SDIOIT flag clear bit
SDIOITC : Boolean := False;
-- CEATAEND flag clear bit
CEATAENDC : Boolean := False;
-- unspecified
Reserved_24_31 : HAL.UInt8 := 16#0#;
end record
with Volatile_Full_Access, Size => 32,
Bit_Order => System.Low_Order_First;
for ICR_Register use record
CCRCFAILC at 0 range 0 .. 0;
DCRCFAILC at 0 range 1 .. 1;
CTIMEOUTC at 0 range 2 .. 2;
DTIMEOUTC at 0 range 3 .. 3;
TXUNDERRC at 0 range 4 .. 4;
RXOVERRC at 0 range 5 .. 5;
CMDRENDC at 0 range 6 .. 6;
CMDSENTC at 0 range 7 .. 7;
DATAENDC at 0 range 8 .. 8;
STBITERRC at 0 range 9 .. 9;
DBCKENDC at 0 range 10 .. 10;
Reserved_11_21 at 0 range 11 .. 21;
SDIOITC at 0 range 22 .. 22;
CEATAENDC at 0 range 23 .. 23;
Reserved_24_31 at 0 range 24 .. 31;
end record;
-- mask register
type MASK_Register is record
-- Command CRC fail interrupt enable
CCRCFAILIE : Boolean := False;
-- Data CRC fail interrupt enable
DCRCFAILIE : Boolean := False;
-- Command timeout interrupt enable
CTIMEOUTIE : Boolean := False;
-- Data timeout interrupt enable
DTIMEOUTIE : Boolean := False;
-- Tx FIFO underrun error interrupt enable
TXUNDERRIE : Boolean := False;
-- Rx FIFO overrun error interrupt enable
RXOVERRIE : Boolean := False;
-- Command response received interrupt enable
CMDRENDIE : Boolean := False;
-- Command sent interrupt enable
CMDSENTIE : Boolean := False;
-- Data end interrupt enable
DATAENDIE : Boolean := False;
-- Start bit error interrupt enable
STBITERRIE : Boolean := False;
-- Data block end interrupt enable
DBCKENDIE : Boolean := False;
-- Command acting interrupt enable
CMDACTIE : Boolean := False;
-- Data transmit acting interrupt enable
TXACTIE : Boolean := False;
-- Data receive acting interrupt enable
RXACTIE : Boolean := False;
-- Tx FIFO half empty interrupt enable
TXFIFOHEIE : Boolean := False;
-- Rx FIFO half full interrupt enable
RXFIFOHFIE : Boolean := False;
-- Tx FIFO full interrupt enable
TXFIFOFIE : Boolean := False;
-- Rx FIFO full interrupt enable
RXFIFOFIE : Boolean := False;
-- Tx FIFO empty interrupt enable
TXFIFOEIE : Boolean := False;
-- Rx FIFO empty interrupt enable
RXFIFOEIE : Boolean := False;
-- Data available in Tx FIFO interrupt enable
TXDAVLIE : Boolean := False;
-- Data available in Rx FIFO interrupt enable
RXDAVLIE : Boolean := False;
-- SDIO mode interrupt received interrupt enable
SDIOITIE : Boolean := False;
-- CE-ATA command completion signal received interrupt enable
CEATAENDIE : Boolean := False;
-- unspecified
Reserved_24_31 : HAL.UInt8 := 16#0#;
end record
with Volatile_Full_Access, Size => 32,
Bit_Order => System.Low_Order_First;
for MASK_Register use record
CCRCFAILIE at 0 range 0 .. 0;
DCRCFAILIE at 0 range 1 .. 1;
CTIMEOUTIE at 0 range 2 .. 2;
DTIMEOUTIE at 0 range 3 .. 3;
TXUNDERRIE at 0 range 4 .. 4;
RXOVERRIE at 0 range 5 .. 5;
CMDRENDIE at 0 range 6 .. 6;
CMDSENTIE at 0 range 7 .. 7;
DATAENDIE at 0 range 8 .. 8;
STBITERRIE at 0 range 9 .. 9;
DBCKENDIE at 0 range 10 .. 10;
CMDACTIE at 0 range 11 .. 11;
TXACTIE at 0 range 12 .. 12;
RXACTIE at 0 range 13 .. 13;
TXFIFOHEIE at 0 range 14 .. 14;
RXFIFOHFIE at 0 range 15 .. 15;
TXFIFOFIE at 0 range 16 .. 16;
RXFIFOFIE at 0 range 17 .. 17;
TXFIFOEIE at 0 range 18 .. 18;
RXFIFOEIE at 0 range 19 .. 19;
TXDAVLIE at 0 range 20 .. 20;
RXDAVLIE at 0 range 21 .. 21;
SDIOITIE at 0 range 22 .. 22;
CEATAENDIE at 0 range 23 .. 23;
Reserved_24_31 at 0 range 24 .. 31;
end record;
subtype FIFOCNT_FIFOCOUNT_Field is HAL.UInt24;
-- FIFO counter register
type FIFOCNT_Register is record
-- Read-only. Remaining number of words to be written to or read from
-- the FIFO
FIFOCOUNT : FIFOCNT_FIFOCOUNT_Field;
-- unspecified
Reserved_24_31 : HAL.UInt8;
end record
with Volatile_Full_Access, Size => 32,
Bit_Order => System.Low_Order_First;
for FIFOCNT_Register use record
FIFOCOUNT at 0 range 0 .. 23;
Reserved_24_31 at 0 range 24 .. 31;
end record;
-----------------
-- Peripherals --
-----------------
-- Secure digital input/output interface
type SDMMC_Peripheral is record
-- power control register
POWER : aliased POWER_Register;
-- SDI clock control register
CLKCR : aliased CLKCR_Register;
-- argument register
ARG : aliased HAL.UInt32;
-- command register
CMD : aliased CMD_Register;
-- command response register
RESPCMD : aliased RESPCMD_Register;
-- response 1..4 register
RESP1 : aliased HAL.UInt32;
-- response 1..4 register
RESP2 : aliased HAL.UInt32;
-- response 1..4 register
RESP3 : aliased HAL.UInt32;
-- response 1..4 register
RESP4 : aliased HAL.UInt32;
-- data timer register
DTIMER : aliased HAL.UInt32;
-- data length register
DLEN : aliased DLEN_Register;
-- data control register
DCTRL : aliased DCTRL_Register;
-- data counter register
DCOUNT : aliased DCOUNT_Register;
-- status register
STA : aliased STA_Register;
-- interrupt clear register
ICR : aliased ICR_Register;
-- mask register
MASK : aliased MASK_Register;
-- FIFO counter register
FIFOCNT : aliased FIFOCNT_Register;
-- data FIFO register
FIFO : aliased HAL.UInt32;
end record
with Volatile;
for SDMMC_Peripheral use record
POWER at 16#0# range 0 .. 31;
CLKCR at 16#4# range 0 .. 31;
ARG at 16#8# range 0 .. 31;
CMD at 16#C# range 0 .. 31;
RESPCMD at 16#10# range 0 .. 31;
RESP1 at 16#14# range 0 .. 31;
RESP2 at 16#18# range 0 .. 31;
RESP3 at 16#1C# range 0 .. 31;
RESP4 at 16#20# range 0 .. 31;
DTIMER at 16#24# range 0 .. 31;
DLEN at 16#28# range 0 .. 31;
DCTRL at 16#2C# range 0 .. 31;
DCOUNT at 16#30# range 0 .. 31;
STA at 16#34# range 0 .. 31;
ICR at 16#38# range 0 .. 31;
MASK at 16#3C# range 0 .. 31;
FIFOCNT at 16#48# range 0 .. 31;
FIFO at 16#80# range 0 .. 31;
end record;
-- Secure digital input/output interface
SDMMC_Periph : aliased SDMMC_Peripheral
with Import, Address => System'To_Address (16#40012800#);
end STM32_SVD.SDIO;
| 34.919075 | 78 | 0.567732 |
388b87ce563fead718fd977e6446cdb88563b206 | 2,790 | ads | Ada | Validation/pyFrame3DD-master/gcc-master/gcc/ada/libgnat/g-soliop__solaris.ads | djamal2727/Main-Bearing-Analytical-Model | 2f00c2219c71be0175c6f4f8f1d4cca231d97096 | [
"Apache-2.0"
] | null | null | null | Validation/pyFrame3DD-master/gcc-master/gcc/ada/libgnat/g-soliop__solaris.ads | djamal2727/Main-Bearing-Analytical-Model | 2f00c2219c71be0175c6f4f8f1d4cca231d97096 | [
"Apache-2.0"
] | null | null | null | Validation/pyFrame3DD-master/gcc-master/gcc/ada/libgnat/g-soliop__solaris.ads | djamal2727/Main-Bearing-Analytical-Model | 2f00c2219c71be0175c6f4f8f1d4cca231d97096 | [
"Apache-2.0"
] | null | null | null | ------------------------------------------------------------------------------
-- --
-- GNAT COMPILER COMPONENTS --
-- --
-- G N A T . S O C K E T S . L I N K E R _ O P T I O N S --
-- --
-- S p e c --
-- --
-- Copyright (C) 2001-2020, AdaCore --
-- --
-- GNAT is free software; you can redistribute it and/or modify it under --
-- terms of the GNU General Public License as published by the Free Soft- --
-- ware Foundation; either version 3, or (at your option) any later ver- --
-- sion. GNAT is distributed in the hope that it will be useful, but WITH- --
-- OUT ANY WARRANTY; without even the implied warranty of MERCHANTABILITY --
-- or FITNESS FOR A PARTICULAR PURPOSE. --
-- --
-- As a special exception under Section 7 of GPL version 3, you are granted --
-- additional permissions described in the GCC Runtime Library Exception, --
-- version 3.1, as published by the Free Software Foundation. --
-- --
-- You should have received a copy of the GNU General Public License and --
-- a copy of the GCC Runtime Library Exception along with this program; --
-- see the files COPYING3 and COPYING.RUNTIME respectively. If not, see --
-- <http://www.gnu.org/licenses/>. --
-- --
-- GNAT was originally developed by the GNAT team at New York University. --
-- Extensive contributions were provided by Ada Core Technologies Inc. --
-- --
------------------------------------------------------------------------------
-- This package is used to provide target specific linker_options for the
-- support of sockets as required by the package GNAT.Sockets.
-- This is the Solaris version of this package
-- This package should not be directly with'ed by an application program
package GNAT.Sockets.Linker_Options is
private
pragma Linker_Options ("-lnsl");
pragma Linker_Options ("-lsocket");
end GNAT.Sockets.Linker_Options;
| 63.409091 | 78 | 0.423656 |
38797aa19bf834f66248b642524dce7d775c92e3 | 2,695 | ads | Ada | src/giza-bitmaps-indexed_4bits.ads | Fabien-Chouteau/Giza | 9f6c167666dbba8f0e5f0ba3e33825c0b3f399bd | [
"BSD-3-Clause"
] | 7 | 2017-10-18T02:40:24.000Z | 2020-12-19T22:41:19.000Z | src/giza-bitmaps-indexed_4bits.ads | Fabien-Chouteau/Giza | 9f6c167666dbba8f0e5f0ba3e33825c0b3f399bd | [
"BSD-3-Clause"
] | null | null | null | src/giza-bitmaps-indexed_4bits.ads | Fabien-Chouteau/Giza | 9f6c167666dbba8f0e5f0ba3e33825c0b3f399bd | [
"BSD-3-Clause"
] | 2 | 2019-05-06T08:30:26.000Z | 2020-11-22T11:27:27.000Z | ------------------------------------------------------------------------------
-- --
-- Giza --
-- --
-- Copyright (C) 2016 Fabien Chouteau ([email protected]) --
-- --
-- --
-- Redistribution and use in source and binary forms, with or without --
-- modification, are permitted provided that the following conditions are --
-- met: --
-- 1. Redistributions of source code must retain the above copyright --
-- notice, this list of conditions and the following disclaimer. --
-- 2. Redistributions in binary form must reproduce the above copyright --
-- notice, this list of conditions and the following disclaimer in --
-- the documentation and/or other materials provided with the --
-- distribution. --
-- 3. Neither the name of the copyright holder nor the names of its --
-- contributors may be used to endorse or promote products derived --
-- from this software without specific prior written permission. --
-- --
-- THIS SOFTWARE IS PROVIDED BY THE COPYRIGHT HOLDERS AND CONTRIBUTORS --
-- "AS IS" AND ANY EXPRESS OR IMPLIED WARRANTIES, INCLUDING, BUT NOT --
-- LIMITED TO, THE IMPLIED WARRANTIES OF MERCHANTABILITY AND FITNESS FOR --
-- A PARTICULAR PURPOSE ARE DISCLAIMED. IN NO EVENT SHALL THE COPYRIGHT --
-- HOLDER OR CONTRIBUTORS BE LIABLE FOR ANY DIRECT, INDIRECT, INCIDENTAL, --
-- SPECIAL, EXEMPLARY, OR CONSEQUENTIAL DAMAGES (INCLUDING, BUT NOT --
-- LIMITED TO, PROCUREMENT OF SUBSTITUTE GOODS OR SERVICES; LOSS OF USE, --
-- DATA, OR PROFITS; OR BUSINESS INTERRUPTION) HOWEVER CAUSED AND ON ANY --
-- THEORY OF LIABILITY, WHETHER IN CONTRACT, STRICT LIABILITY, OR TORT --
-- (INCLUDING NEGLIGENCE OR OTHERWISE) ARISING IN ANY WAY OUT OF THE USE --
-- OF THIS SOFTWARE, EVEN IF ADVISED OF THE POSSIBILITY OF SUCH DAMAGE. --
-- --
------------------------------------------------------------------------------
package Giza.Bitmaps.Indexed_4bits is
new Giza.Bitmaps.Indexed_Bitmaps (Unsigned_4);
| 72.837838 | 78 | 0.479406 |
ad7fc641d966cfb3b6e1269f2db489a529de4b75 | 4,131 | ads | Ada | tools-src/gnu/gcc/gcc/ada/a-wtenau.ads | modern-tomato/tomato | 96f09fab4929c6ddde5c9113f1b2476ad37133c4 | [
"FSFAP"
] | 80 | 2015-01-02T10:14:04.000Z | 2021-06-07T06:29:49.000Z | tools-src/gnu/gcc/gcc/ada/a-wtenau.ads | modern-tomato/tomato | 96f09fab4929c6ddde5c9113f1b2476ad37133c4 | [
"FSFAP"
] | 9 | 2015-05-14T11:03:12.000Z | 2018-01-04T07:12:58.000Z | tools-src/gnu/gcc/gcc/ada/a-wtenau.ads | modern-tomato/tomato | 96f09fab4929c6ddde5c9113f1b2476ad37133c4 | [
"FSFAP"
] | 69 | 2015-01-02T10:45:56.000Z | 2021-09-06T07:52:13.000Z | ------------------------------------------------------------------------------
-- --
-- GNAT RUN-TIME COMPONENTS --
-- --
-- A D A . W I D E _ T E X T _ I O . E N U M E R A T I O N _ A U X --
-- --
-- S p e c --
-- --
-- $Revision$
-- --
-- Copyright (C) 1992-1997 Free Software Foundation, Inc. --
-- --
-- GNAT is free software; you can redistribute it and/or modify it under --
-- terms of the GNU General Public License as published by the Free Soft- --
-- ware Foundation; either version 2, or (at your option) any later ver- --
-- sion. GNAT is distributed in the hope that it will be useful, but WITH- --
-- OUT ANY WARRANTY; without even the implied warranty of MERCHANTABILITY --
-- or FITNESS FOR A PARTICULAR PURPOSE. See the GNU General Public License --
-- for more details. You should have received a copy of the GNU General --
-- Public License distributed with GNAT; see file COPYING. If not, write --
-- to the Free Software Foundation, 59 Temple Place - Suite 330, Boston, --
-- MA 02111-1307, USA. --
-- --
-- As a special exception, if other files instantiate generics from this --
-- unit, or you link this unit with other files to produce an executable, --
-- this unit does not by itself cause the resulting executable to be --
-- covered by the GNU General Public License. This exception does not --
-- however invalidate any other reasons why the executable file might be --
-- covered by the GNU Public License. --
-- --
-- GNAT was originally developed by the GNAT team at New York University. --
-- Extensive contributions were provided by Ada Core Technologies Inc. --
-- --
------------------------------------------------------------------------------
-- This package contains the routines for Ada.Wide_Text_IO.Enumeration_IO
-- that are shared among separate instantiations.
private package Ada.Wide_Text_IO.Enumeration_Aux is
procedure Get_Enum_Lit
(File : File_Type;
Buf : out Wide_String;
Buflen : out Natural);
-- Reads an enumeration literal value from the file, folds to upper case,
-- and stores the result in Buf, setting Buflen to the number of stored
-- characters (Buf has a lower bound of 1). If more than Buflen characters
-- are present in the literal, Data_Error is raised.
procedure Scan_Enum_Lit
(From : Wide_String;
Start : out Natural;
Stop : out Natural);
-- Scans an enumeration literal at the start of From, skipping any leading
-- spaces. Sets Start to the first character, Stop to the last character.
-- Raises End_Error if no enumeration literal is found.
procedure Put
(File : File_Type;
Item : Wide_String;
Width : Field;
Set : Type_Set);
-- Outputs the enumeration literal image stored in Item to the given File,
-- using the given Width and Set parameters (Item is always in upper case).
procedure Puts
(To : out Wide_String;
Item : in Wide_String;
Set : Type_Set);
-- Stores the enumeration literal image stored in Item to the string To,
-- padding with trailing spaces if necessary to fill To. Set is used to
end Ada.Wide_Text_IO.Enumeration_Aux;
| 55.824324 | 79 | 0.503026 |
9a2c325ca80377fc4123cf4bb95c4d1346637cf7 | 1,153 | ads | Ada | gnu/src/gdb/gdb/testsuite/gdb.ada/byte_packed_arr/reprod.ads | ghsecuritylab/ellcc-mirror | b03a4afac74d50cf0987554b8c0cd8209bcb92a2 | [
"BSD-2-Clause"
] | null | null | null | gnu/src/gdb/gdb/testsuite/gdb.ada/byte_packed_arr/reprod.ads | ghsecuritylab/ellcc-mirror | b03a4afac74d50cf0987554b8c0cd8209bcb92a2 | [
"BSD-2-Clause"
] | null | null | null | gnu/src/gdb/gdb/testsuite/gdb.ada/byte_packed_arr/reprod.ads | ghsecuritylab/ellcc-mirror | b03a4afac74d50cf0987554b8c0cd8209bcb92a2 | [
"BSD-2-Clause"
] | null | null | null | -- Copyright 2015 Free Software Foundation, Inc.
--
-- This program is free software; you can redistribute it and/or modify
-- it under the terms of the GNU General Public License as published by
-- the Free Software Foundation; either version 3 of the License, or
-- (at your option) any later version.
--
-- This program is distributed in the hope that it will be useful,
-- but WITHOUT ANY WARRANTY; without even the implied warranty of
-- MERCHANTABILITY or FITNESS FOR A PARTICULAR PURPOSE. See the
-- GNU General Public License for more details.
--
-- You should have received a copy of the GNU General Public License
-- along with this program. If not, see <http://www.gnu.org/licenses/>.
with Array_List_G;
package Reprod is
package Objects is
type T is record
I : Integer;
end record;
package List is new Array_List_G (Index_Base_T => Natural,
Component_T => T);
end Objects;
type Obj_T (Len : Natural) is record
Data : Objects.List.T (1 .. Len);
end record;
type T is access Obj_T;
procedure Do_Nothing (Broken : Obj_T);
end Reprod;
| 32.027778 | 73 | 0.679098 |
38217555a265647f26be9fb5cad3926d76122d8f | 1,134 | adb | Ada | example/src/trendy_terminal_example.adb | pyjarrett/archaic_terminal | ce1e5331a66ed9aa7ae0dc6c41ffa4851919a1f8 | [
"Apache-2.0"
] | 3 | 2021-11-03T18:27:41.000Z | 2022-03-01T18:15:34.000Z | example/src/trendy_terminal_example.adb | pyjarrett/archaic_terminal | ce1e5331a66ed9aa7ae0dc6c41ffa4851919a1f8 | [
"Apache-2.0"
] | 2 | 2021-09-05T13:35:39.000Z | 2021-09-11T21:27:38.000Z | example/src/trendy_terminal_example.adb | pyjarrett/trendy_terminal | ce1e5331a66ed9aa7ae0dc6c41ffa4851919a1f8 | [
"Apache-2.0"
] | null | null | null | with Ada.Text_IO;
with Trendy_Terminal.Environments;
with Trendy_Terminal.IO;
with Trendy_Terminal.Platform;
with Trendy_Terminal.Example.Input; use Trendy_Terminal.Example.Input;
procedure Trendy_Terminal_Example is
Env : Trendy_Terminal.Environments.Environment;
begin
if not Env.Is_Available then
Ada.Text_IO.Put_Line ("Unable to initialize Trendy Terminal.");
return;
end if;
Trendy_Terminal.Platform.Set (Trendy_Terminal.Platform.Echo, False);
Trendy_Terminal.Platform.Set (Trendy_Terminal.Platform.Line_Input, False);
Trendy_Terminal.Platform.Set (Trendy_Terminal.Platform.Escape_Sequences, True);
Trendy_Terminal.Platform.Set (Trendy_Terminal.Platform.Signals_As_Input, True);
Trendy_Terminal.IO.Put_Line ("Hello, world.");
Trendy_Terminal.IO.Put_Line ("Columns");
Trendy_Terminal.IO.Put_Line ("12345678901234567890123456789012345678901234567890");
Trendy_Terminal.IO.Put ("Move to column: ");
Trendy_Terminal.IO.Set_Col (20);
Trendy_Terminal.IO.Put_Line ("At column 20");
Trendy_Terminal.Example.Input.Run_Print_Input;
end Trendy_Terminal_Example;
| 36.580645 | 87 | 0.777778 |
410b8032e67c08879837967579bebff4d914f051 | 7,935 | adb | Ada | src/common/sp-cache.adb | CyberFlameGO/septum | 8cf7aa48662f03b3e1d629c3fc1b640e3f787f67 | [
"Apache-2.0"
] | null | null | null | src/common/sp-cache.adb | CyberFlameGO/septum | 8cf7aa48662f03b3e1d629c3fc1b640e3f787f67 | [
"Apache-2.0"
] | null | null | null | src/common/sp-cache.adb | CyberFlameGO/septum | 8cf7aa48662f03b3e1d629c3fc1b640e3f787f67 | [
"Apache-2.0"
] | null | null | null | -------------------------------------------------------------------------------
-- Copyright 2021, The Septum Developers (see AUTHORS file)
-- Licensed under the Apache License, Version 2.0 (the "License");
-- you may not use this file except in compliance with the License.
-- You may obtain a copy of the License at
-- http://www.apache.org/licenses/LICENSE-2.0
-- Unless required by applicable law or agreed to in writing, software
-- distributed under the License is distributed on an "AS IS" BASIS,
-- WITHOUT WARRANTIES OR CONDITIONS OF ANY KIND, either express or implied.
-- See the License for the specific language governing permissions and
-- limitations under the License.
-------------------------------------------------------------------------------
with Ada.Containers.Synchronized_Queue_Interfaces;
with Ada.Containers.Unbounded_Synchronized_Queues;
with Ada.Directories;
with Ada.Task_Identification;
with SP.Cache;
with SP.File_System;
with SP.Progress;
with SP.Terminal;
with System.Multiprocessors.Dispatching_Domains;
with Dir_Iterators.Recursive;
with Progress_Indicators.Work_Trackers;
package body SP.Cache is
-- Convenience function for converting strings to unbounded.
function "+" (Str : String) return Ada.Strings.Unbounded.Unbounded_String renames To_Unbounded_String;
function Is_Text (File_Name : String) return Boolean is
-- This is probably better written to look at encoding (such as invalid sequences in UTF-8, etc.)
-- instead of being a hodgepodge of various formats I know that I care about right now.
-- TODO: Adding more file types I care about now, this needs to be fixed properly.
Extension : String renames Ada.Directories.Extension (File_Name);
begin
return Extension in
"ads" | -- Ada
"adb" |
"c" | -- c
"h" |
"cpp" | -- C++
"C" |
"hpp" |
"hh" |
"inl" |
"lock" |
"toml" |
"cs" | -- C#
"hs" | -- Haskell
"py" | -- Python
"rs"; -- Rust
end Is_Text;
procedure Cache_File (File_Cache : in out Async_File_Cache; File_Name : Ada.Strings.Unbounded.Unbounded_String) is
Lines : String_Vectors.Vector := String_Vectors.Empty_Vector;
begin
if SP.File_System.Read_Lines (To_String (File_Name), Lines) then
File_Cache.Cache_File (File_Name, Lines);
end if;
end Cache_File;
protected body Async_File_Cache is
procedure Clear is
begin
Contents.Clear;
end Clear;
procedure Cache_File (File_Name : in Unbounded_String; Lines : in String_Vectors.Vector) is
begin
if Contents.Contains (File_Name) then
SP.Terminal.Put_Line ("Replacing contents of " & To_String (File_Name));
Contents.Replace (File_Name, Lines);
else
Contents.Insert (File_Name, Lines);
end if;
end Cache_File;
function Num_Files return Natural is
begin
return Natural (Contents.Length);
end Num_Files;
function Num_Lines return Natural is
begin
return N : Natural := 0 do
for Cursor in Contents.Iterate loop
N := N + Natural (File_Maps.Element (Cursor).Length);
end loop;
end return;
end Num_Lines;
function Lines (File_Name : in Unbounded_String) return String_Vectors.Vector is
begin
return Contents (File_Name);
end Lines;
function Files return String_Vectors.Vector is
begin
return Result : String_Vectors.Vector do
for Cursor in Contents.Iterate loop
Result.Append (SP.Cache.File_Maps.Key (Cursor));
end loop;
end return;
end Files;
function File_Line (File_Name : in Unbounded_String; Line : in Positive) return Unbounded_String is
begin
return Contents.Element (File_Name).Element (Line);
end File_Line;
end Async_File_Cache;
-- Adds all directories to the file cache.
--
-- Most users will probably only have source on a single medium, so
-- parallelizing the load probably won't improve speed. The split of
-- parsing tasks is to support more complicated caching methods in the
-- future, as we're I/O bound here based on the disk speed.
function Add_Directory_Recursively (
A : in out Async_File_Cache;
Dir : String) return Boolean
is
package String_Queue_Interface is new Ada.Containers.Synchronized_Queue_Interfaces
(Element_Type => Ada.Strings.Unbounded.Unbounded_String);
package String_Unbounded_Queue is new Ada.Containers.Unbounded_Synchronized_Queues
(Queue_Interfaces => String_Queue_Interface);
File_Queue : String_Unbounded_Queue.Queue;
package PI renames Progress_Indicators;
Progress : aliased PI.Work_Trackers.Work_Tracker;
begin
declare
-- A directory loading task builds a queue of files to parse for the
-- file loader tasks.
task Dir_Loader_Task with CPU => 1 is end;
task body Dir_Loader_Task is
Dir_Walk : constant Dir_Iterators.Recursive.Recursive_Dir_Walk := Dir_Iterators.Recursive.Walk (Dir);
use type Ada.Directories.File_Kind;
begin
for Dir_Entry of Dir_Walk loop
if Ada.Directories.Kind (Dir_Entry) = Ada.Directories.Ordinary_File then
File_Queue.Enqueue
(Ada.Strings.Unbounded.To_Unbounded_String (Ada.Directories.Full_Name (Dir_Entry)));
Progress.Start_Work (1);
end if;
end loop;
end Dir_Loader_Task;
task type File_Loader_Task is
entry Wake;
end File_Loader_Task;
task body File_Loader_Task is
Elem : Ada.Strings.Unbounded.Unbounded_String;
begin
loop
-- Allowing queueing of many tasks, some of which might not be used, but will not prevent the
-- program from continuing.
select
accept Wake;
or
terminate;
end select;
loop
select
File_Queue.Dequeue (Elem);
or
delay 1.0;
exit;
end select;
if Is_Text (To_String (Elem)) then
Cache_File (A, Elem);
end if;
Progress.Finish_Work (1);
end loop;
end loop;
end File_Loader_Task;
Progress_Tracker : SP.Progress.Update_Progress (Progress'Access);
Num_CPUs : constant System.Multiprocessors.CPU := System.Multiprocessors.Number_Of_CPUs;
begin
SP.Terminal.Put_Line ("Loading with" & Num_CPUs'Image & " tasks.");
SP.Terminal.New_Line;
declare
File_Loader : array (1 .. Num_CPUs) of File_Loader_Task;
begin
for I in File_Loader'Range loop
System.Multiprocessors.Dispatching_Domains.Set_CPU (I, File_Loader(I)'Identity);
File_Loader(I).Wake;
end loop;
end;
Progress_Tracker.Stop;
SP.Terminal.New_Line;
return True;
end;
end Add_Directory_Recursively;
end SP.Cache;
| 37.429245 | 118 | 0.574669 |
2e5f1929fd26fec1c485f8adf2ea5086915ea182 | 9,689 | adb | Ada | testsuite/xml/xmlconf_test.adb | svn2github/matreshka | 9d222b3ad9da508855fb1f5adbe5e8a4fad4c530 | [
"BSD-3-Clause"
] | 24 | 2016-11-29T06:59:41.000Z | 2021-08-30T11:55:16.000Z | testsuite/xml/xmlconf_test.adb | svn2github/matreshka | 9d222b3ad9da508855fb1f5adbe5e8a4fad4c530 | [
"BSD-3-Clause"
] | 2 | 2019-01-16T05:15:20.000Z | 2019-02-03T10:03:32.000Z | testsuite/xml/xmlconf_test.adb | svn2github/matreshka | 9d222b3ad9da508855fb1f5adbe5e8a4fad4c530 | [
"BSD-3-Clause"
] | 4 | 2017-07-18T07:11:05.000Z | 2020-06-21T03:02:25.000Z | ------------------------------------------------------------------------------
-- --
-- Matreshka Project --
-- --
-- XML Processor --
-- --
-- Testsuite Component --
-- --
------------------------------------------------------------------------------
-- --
-- Copyright © 2010-2014, Vadim Godunko <[email protected]> --
-- All rights reserved. --
-- --
-- Redistribution and use in source and binary forms, with or without --
-- modification, are permitted provided that the following conditions --
-- are met: --
-- --
-- * Redistributions of source code must retain the above copyright --
-- notice, this list of conditions and the following disclaimer. --
-- --
-- * Redistributions in binary form must reproduce the above copyright --
-- notice, this list of conditions and the following disclaimer in the --
-- documentation and/or other materials provided with the distribution. --
-- --
-- * Neither the name of the Vadim Godunko, IE nor the names of its --
-- contributors may be used to endorse or promote products derived from --
-- this software without specific prior written permission. --
-- --
-- THIS SOFTWARE IS PROVIDED BY THE COPYRIGHT HOLDERS AND CONTRIBUTORS --
-- "AS IS" AND ANY EXPRESS OR IMPLIED WARRANTIES, INCLUDING, BUT NOT --
-- LIMITED TO, THE IMPLIED WARRANTIES OF MERCHANTABILITY AND FITNESS FOR --
-- A PARTICULAR PURPOSE ARE DISCLAIMED. IN NO EVENT SHALL THE COPYRIGHT --
-- HOLDER OR CONTRIBUTORS BE LIABLE FOR ANY DIRECT, INDIRECT, INCIDENTAL, --
-- SPECIAL, EXEMPLARY, OR CONSEQUENTIAL DAMAGES (INCLUDING, BUT NOT LIMITED --
-- TO, PROCUREMENT OF SUBSTITUTE GOODS OR SERVICES; LOSS OF USE, DATA, OR --
-- PROFITS; OR BUSINESS INTERRUPTION) HOWEVER CAUSED AND ON ANY THEORY OF --
-- LIABILITY, WHETHER IN CONTRACT, STRICT LIABILITY, OR TORT (INCLUDING --
-- NEGLIGENCE OR OTHERWISE) ARISING IN ANY WAY OUT OF THE USE OF THIS --
-- SOFTWARE, EVEN IF ADVISED OF THE POSSIBILITY OF SUCH DAMAGE. --
-- --
------------------------------------------------------------------------------
-- $Revision$ $Date$
------------------------------------------------------------------------------
with Ada.Command_Line;
with Ada.Characters.Conversions;
with Ada.Directories;
with Ada.Integer_Text_IO;
with Ada.Text_IO;
with League.Application;
with League.Strings;
with XML.SAX.File_Input_Sources;
with XML.SAX.Simple_Readers;
with XMLConf.Testsuite_Handlers;
procedure XMLConf_Test is
use XMLConf;
use Ada.Integer_Text_IO;
use Ada.Text_IO;
type Percent is delta 0.01 range 0.00 .. 100.00;
Data : constant League.Strings.Universal_String
:= League.Application.Arguments.Element (1);
Source : aliased XML.SAX.File_Input_Sources.File_Input_Source;
Reader : aliased XML.SAX.Simple_Readers.Simple_Reader;
Handler : aliased XMLConf.Testsuite_Handlers.Testsuite_Handler;
Enabled : Test_Flags := (others => True);
Validating : Boolean := False;
Passed : Natural;
Failed : Natural;
Suppressed : Natural;
begin
if Ada.Command_Line.Argument_Count > 1 then
Enabled := (others => False);
for J in 2 .. Ada.Command_Line.Argument_Count loop
if Ada.Command_Line.Argument (J) = "--valid" then
Enabled (Valid) := True;
elsif Ada.Command_Line.Argument (J) = "--invalid" then
Enabled (Invalid) := True;
elsif Ada.Command_Line.Argument (J) = "--not-wellformed" then
Enabled (Not_Wellformed) := True;
elsif Ada.Command_Line.Argument (J) = "--error" then
Enabled (Error) := True;
elsif Ada.Command_Line.Argument (J) = "--validating" then
Validating := True;
else
raise Program_Error;
end if;
end loop;
end if;
-- Load set of suppressed tests.
Handler.Read_Suppressed
(Ada.Directories.Containing_Directory
(Ada.Directories.Containing_Directory
(Ada.Characters.Conversions.To_String (Data.To_Wide_Wide_String)))
& "/suppressed.lst");
-- Because of limitations of current implementation in tracking relative
-- paths for entities the current working directory is changed to the
-- containing directory of the testsuite description file.
Reader.Set_Content_Handler (Handler'Unchecked_Access);
Reader.Set_Error_Handler (Handler'Unchecked_Access);
Source.Open_By_File_Name (Data);
Handler.Enabled := Enabled;
Handler.Validating := Validating;
Reader.Parse (Source'Access);
Passed :=
Handler.Results (Valid).Passed
+ Handler.Results (Invalid).Passed
+ Handler.Results (Not_Wellformed).Passed
+ Handler.Results (Error).Passed;
Failed :=
Handler.Results (Valid).Failed
+ Handler.Results (Invalid).Failed
+ Handler.Results (Not_Wellformed).Failed
+ Handler.Results (Error).Failed;
Suppressed :=
Handler.Results (Valid).Suppressed
+ Handler.Results (Invalid).Suppressed
+ Handler.Results (Not_Wellformed).Suppressed
+ Handler.Results (Error).Suppressed;
if Failed = 0 then
return;
end if;
Put_Line (" Group Passed Failed Skiped | Crash Output SAX");
Put_Line ("------- ------ ------ ------ | ------ ------ ------");
if Enabled (Valid) then
Put ("valid ");
Put (Handler.Results (Valid).Passed, 7);
Put (Handler.Results (Valid).Failed, 7);
Put (Handler.Results (Valid).Suppressed, 7);
Put (" |");
Put (Handler.Results (Valid).Crash, 7);
Put (Handler.Results (Valid).Output, 7);
Put (Handler.Results (Valid).SAX, 7);
New_Line;
end if;
if Enabled (Invalid) then
Put ("invalid");
Put (Handler.Results (Invalid).Passed, 7);
Put (Handler.Results (Invalid).Failed, 7);
Put (Handler.Results (Invalid).Suppressed, 7);
Put (" |");
Put (Handler.Results (Invalid).Crash, 7);
Put (Handler.Results (Invalid).Output, 7);
Put (Handler.Results (Invalid).SAX, 7);
New_Line;
end if;
if Enabled (Not_Wellformed) then
Put ("not-wf ");
Put (Handler.Results (Not_Wellformed).Passed, 7);
Put (Handler.Results (Not_Wellformed).Failed, 7);
Put (Handler.Results (Not_Wellformed).Suppressed, 7);
Put (" |");
Put (Handler.Results (Not_Wellformed).Crash, 7);
Put (Handler.Results (Not_Wellformed).Output, 7);
Put (Handler.Results (Not_Wellformed).SAX, 7);
New_Line;
end if;
if Enabled (Error) then
Put ("error ");
Put (Handler.Results (Error).Passed, 7);
Put (Handler.Results (Error).Failed, 7);
Put (Handler.Results (Error).Suppressed, 7);
Put (" |");
Put (Handler.Results (Error).Crash, 7);
Put (Handler.Results (Error).Output, 7);
Put (Handler.Results (Error).SAX, 7);
New_Line;
end if;
Put_Line (" ------ ------ ------ | ------ ------ ------");
Put (" ");
Put
(Handler.Results (Valid).Passed
+ Handler.Results (Invalid).Passed
+ Handler.Results (Not_Wellformed).Passed
+ Handler.Results (Error).Passed,
7);
Put
(Handler.Results (Valid).Failed
+ Handler.Results (Invalid).Failed
+ Handler.Results (Not_Wellformed).Failed
+ Handler.Results (Error).Failed,
7);
Put
(Handler.Results (Valid).Suppressed
+ Handler.Results (Invalid).Suppressed
+ Handler.Results (Not_Wellformed).Suppressed
+ Handler.Results (Error).Suppressed,
7);
Put (" |");
Put
(Handler.Results (Valid).Crash
+ Handler.Results (Invalid).Crash
+ Handler.Results (Not_Wellformed).Crash
+ Handler.Results (Error).Crash,
7);
Put
(Handler.Results (Valid).Output
+ Handler.Results (Invalid).Output
+ Handler.Results (Not_Wellformed).Output
+ Handler.Results (Error).Output,
7);
Put
(Handler.Results (Valid).SAX
+ Handler.Results (Invalid).SAX
+ Handler.Results (Not_Wellformed).SAX
+ Handler.Results (Error).SAX,
7);
New_Line;
New_Line;
Put_Line
("Status:"
& Percent'Image
(Percent
(Float (Passed) / Float (Passed + Failed + Suppressed) * 100.0))
& "% passed");
if Handler.Results (Valid).Crash /= 0
or Handler.Results (Invalid).Crash /= 0
or Handler.Results (Not_Wellformed).Crash /= 0
or Handler.Results (Error).Crash /= 0
then
raise Program_Error;
end if;
end XMLConf_Test;
| 38.911647 | 78 | 0.542058 |
386720c5ffaef63eb9e026bbbe502a53377b59a2 | 1,121 | ads | Ada | src/ada-core/src/linted-stdio.ads | mstewartgallus/linted | 4d4cf9390353ea045b95671474ab278456793a35 | [
"Apache-2.0"
] | null | null | null | src/ada-core/src/linted-stdio.ads | mstewartgallus/linted | 4d4cf9390353ea045b95671474ab278456793a35 | [
"Apache-2.0"
] | null | null | null | src/ada-core/src/linted-stdio.ads | mstewartgallus/linted | 4d4cf9390353ea045b95671474ab278456793a35 | [
"Apache-2.0"
] | null | null | null | -- Copyright 2015,2016 Steven Stewart-Gallus
--
-- Licensed under the Apache License, Version 2.0 (the "License");
-- you may not use this file except in compliance with the License.
-- You may obtain a copy of the License at
--
-- http://www.apache.org/licenses/LICENSE-2.0
--
-- Unless required by applicable law or agreed to in writing, software
-- distributed under the License is distributed on an "AS IS" BASIS,
-- WITHOUT WARRANTIES OR CONDITIONS OF ANY KIND, either express or
-- implied. See the License for the specific language governing
-- permissions and limitations under the License.
with Interfaces.C;
with System;
with Linted.Errors;
with Linted.KOs;
package Linted.Stdio is
pragma Elaborate_Body;
procedure Write_Line (Object : Linted.KOs.KO; Str : String);
procedure Write_String
(Object : Linted.KOs.KO;
Str : String;
Err : out Linted.Errors.Error);
procedure Write
(Object : Linted.KOs.KO;
Buf : System.Address;
Count : Interfaces.C.size_t;
Bytes_Written : out Interfaces.C.size_t;
Err : out Linted.Errors.Error);
end Linted.Stdio;
| 30.297297 | 70 | 0.713649 |
2258ad23890af30264b0b8b6756589e1e9e6adca | 17,232 | adb | Ada | src/sys/serialize/util-serialize-io-csv.adb | jquorning/ada-util | 84314f66853ae5a3afe41b62a02eaeb65931cad7 | [
"Apache-2.0"
] | 60 | 2015-01-18T23:05:34.000Z | 2022-03-20T18:56:30.000Z | src/sys/serialize/util-serialize-io-csv.adb | jquorning/ada-util | 84314f66853ae5a3afe41b62a02eaeb65931cad7 | [
"Apache-2.0"
] | 20 | 2016-09-15T16:41:30.000Z | 2022-03-29T22:02:32.000Z | src/sys/serialize/util-serialize-io-csv.adb | jquorning/ada-util | 84314f66853ae5a3afe41b62a02eaeb65931cad7 | [
"Apache-2.0"
] | 10 | 2015-02-13T04:00:45.000Z | 2022-03-20T18:57:54.000Z | -----------------------------------------------------------------------
-- util-serialize-io-csv -- CSV Serialization Driver
-- Copyright (C) 2011, 2015, 2016, 2017, 2021 Stephane Carrez
-- Written by Stephane Carrez ([email protected])
--
-- Licensed under the Apache License, Version 2.0 (the "License");
-- you may not use this file except in compliance with the License.
-- You may obtain a copy of the License at
--
-- http://www.apache.org/licenses/LICENSE-2.0
--
-- Unless required by applicable law or agreed to in writing, software
-- distributed under the License is distributed on an "AS IS" BASIS,
-- WITHOUT WARRANTIES OR CONDITIONS OF ANY KIND, either express or implied.
-- See the License for the specific language governing permissions and
-- limitations under the License.
-----------------------------------------------------------------------
with Ada.Strings.Unbounded;
with Ada.Characters.Latin_1;
with Ada.IO_Exceptions;
with Ada.Containers;
with Util.Strings;
with Util.Dates.ISO8601;
package body Util.Serialize.IO.CSV is
-- ------------------------------
-- Set the field separator. The default field separator is the comma (',').
-- ------------------------------
procedure Set_Field_Separator (Stream : in out Output_Stream;
Separator : in Character) is
begin
Stream.Separator := Separator;
end Set_Field_Separator;
-- ------------------------------
-- Enable or disable the double quotes by default for strings.
-- ------------------------------
procedure Set_Quotes (Stream : in out Output_Stream;
Enable : in Boolean) is
begin
Stream.Quote := Enable;
end Set_Quotes;
-- ------------------------------
-- Write the value as a CSV cell. Special characters are escaped using the CSV
-- escape rules.
-- ------------------------------
procedure Write_Cell (Stream : in out Output_Stream;
Value : in String) is
begin
if Stream.Column > 1 then
Stream.Write (Stream.Separator);
end if;
Stream.Column := Stream.Column + 1;
if Stream.Quote then
Stream.Write ('"');
end if;
for I in Value'Range loop
if Value (I) = '"' then
Stream.Write ("""""");
else
Stream.Write (Value (I));
end if;
end loop;
if Stream.Quote then
Stream.Write ('"');
end if;
end Write_Cell;
procedure Write_Cell (Stream : in out Output_Stream;
Value : in Integer) is
begin
if Stream.Column > 1 then
Stream.Write (Stream.Separator);
end if;
Stream.Column := Stream.Column + 1;
Stream.Write (Util.Strings.Image (Value));
end Write_Cell;
procedure Write_Cell (Stream : in out Output_Stream;
Value : in Boolean) is
begin
if Stream.Column > 1 then
Stream.Write (Stream.Separator);
end if;
Stream.Column := Stream.Column + 1;
if Value then
Stream.Write ("true");
else
Stream.Write ("false");
end if;
end Write_Cell;
procedure Write_Cell (Stream : in out Output_Stream;
Value : in Util.Beans.Objects.Object) is
use Util.Beans.Objects;
begin
case Util.Beans.Objects.Get_Type (Value) is
when TYPE_NULL =>
if Stream.Column > 1 then
Stream.Write (Stream.Separator);
end if;
Stream.Column := Stream.Column + 1;
if Stream.Quote then
Stream.Write ("""null""");
else
Stream.Write ("null");
end if;
when TYPE_BOOLEAN =>
if Stream.Column > 1 then
Stream.Write (Stream.Separator);
end if;
Stream.Column := Stream.Column + 1;
if Util.Beans.Objects.To_Boolean (Value) then
Stream.Write ("true");
else
Stream.Write ("false");
end if;
when TYPE_INTEGER =>
if Stream.Column > 1 then
Stream.Write (Stream.Separator);
end if;
Stream.Column := Stream.Column + 1;
-- Stream.Write ('"');
Stream.Write (Util.Beans.Objects.To_Long_Long_Integer (Value));
-- Stream.Write ('"');
when others =>
Stream.Write_Cell (Util.Beans.Objects.To_String (Value));
end case;
end Write_Cell;
-- ------------------------------
-- Start a new row.
-- ------------------------------
procedure New_Row (Stream : in out Output_Stream) is
begin
while Stream.Column < Stream.Max_Columns loop
Stream.Write (Stream.Separator);
Stream.Column := Stream.Column + 1;
end loop;
Stream.Write (ASCII.CR);
Stream.Write (ASCII.LF);
Stream.Column := 1;
Stream.Row := Stream.Row + 1;
end New_Row;
-- -----------------------
-- Write the attribute name/value pair.
-- -----------------------
overriding
procedure Write_Attribute (Stream : in out Output_Stream;
Name : in String;
Value : in String) is
pragma Unreferenced (Name);
begin
Stream.Write_Cell (Value);
end Write_Attribute;
overriding
procedure Write_Wide_Attribute (Stream : in out Output_Stream;
Name : in String;
Value : in Wide_Wide_String) is
begin
null;
end Write_Wide_Attribute;
overriding
procedure Write_Attribute (Stream : in out Output_Stream;
Name : in String;
Value : in Integer) is
pragma Unreferenced (Name);
begin
Stream.Write_Cell (Value);
end Write_Attribute;
overriding
procedure Write_Attribute (Stream : in out Output_Stream;
Name : in String;
Value : in Boolean) is
pragma Unreferenced (Name);
begin
Stream.Write_Cell (Value);
end Write_Attribute;
overriding
procedure Write_Attribute (Stream : in out Output_Stream;
Name : in String;
Value : in Util.Beans.Objects.Object) is
pragma Unreferenced (Name);
begin
Stream.Write_Cell (Value);
end Write_Attribute;
procedure Write_Entity (Stream : in out Output_Stream;
Name : in String;
Value : in Util.Beans.Objects.Object) is
pragma Unreferenced (Name);
begin
Stream.Write_Cell (Value);
end Write_Entity;
-- -----------------------
-- Write the entity value.
-- -----------------------
overriding
procedure Write_Entity (Stream : in out Output_Stream;
Name : in String;
Value : in String) is
pragma Unreferenced (Name);
begin
Stream.Write_Cell (Value);
end Write_Entity;
overriding
procedure Write_Wide_Entity (Stream : in out Output_Stream;
Name : in String;
Value : in Wide_Wide_String) is
begin
null;
end Write_Wide_Entity;
overriding
procedure Write_Entity (Stream : in out Output_Stream;
Name : in String;
Value : in Boolean) is
pragma Unreferenced (Name);
begin
Stream.Write_Cell (Value);
end Write_Entity;
overriding
procedure Write_Entity (Stream : in out Output_Stream;
Name : in String;
Value : in Integer) is
pragma Unreferenced (Name);
begin
Stream.Write_Cell (Value);
end Write_Entity;
overriding
procedure Write_Entity (Stream : in out Output_Stream;
Name : in String;
Value : in Ada.Calendar.Time) is
begin
Stream.Write_Entity (Name, Util.Dates.ISO8601.Image (Value, Util.Dates.ISO8601.SUBSECOND));
end Write_Entity;
overriding
procedure Write_Long_Entity (Stream : in out Output_Stream;
Name : in String;
Value : in Long_Long_Integer) is
begin
null;
end Write_Long_Entity;
overriding
procedure Write_Enum_Entity (Stream : in out Output_Stream;
Name : in String;
Value : in String) is
begin
Stream.Write_Entity (Name, Value);
end Write_Enum_Entity;
-- ------------------------------
-- Write the attribute with a null value.
-- ------------------------------
overriding
procedure Write_Null_Attribute (Stream : in out Output_Stream;
Name : in String) is
begin
Stream.Write_Entity (Name, "");
end Write_Null_Attribute;
-- ------------------------------
-- Write an entity with a null value.
-- ------------------------------
procedure Write_Null_Entity (Stream : in out Output_Stream;
Name : in String) is
begin
Stream.Write_Null_Attribute (Name);
end Write_Null_Entity;
-- ------------------------------
-- Get the header name for the given column.
-- If there was no header line, build a default header for the column.
-- ------------------------------
function Get_Header_Name (Handler : in Parser;
Column : in Column_Type) return String is
use type Ada.Containers.Count_Type;
Default_Header : constant String := "ABCDEFGHIJKLMNOPQRSTUVWXYZ";
Result : String (1 .. 10);
N, R : Natural;
Pos : Positive := Result'Last;
begin
if Handler.Headers.Length >= Ada.Containers.Count_Type (Column) then
return Handler.Headers.Element (Positive (Column));
end if;
N := Natural (Column - 1);
loop
R := N mod 26;
N := N / 26;
Result (Pos) := Default_Header (R + 1);
exit when N = 0;
Pos := Pos - 1;
end loop;
return Result (Pos .. Result'Last);
end Get_Header_Name;
-- ------------------------------
-- Set the cell value at the given row and column.
-- The default implementation finds the column header name and
-- invokes <b>Write_Entity</b> with the header name and the value.
-- ------------------------------
procedure Set_Cell (Handler : in out Parser;
Value : in String;
Row : in Row_Type;
Column : in Column_Type) is
use Ada.Containers;
begin
if Row = 0 then
-- Build the headers table.
declare
Missing : constant Integer := Integer (Column) - Integer (Handler.Headers.Length);
begin
if Missing > 0 then
Handler.Headers.Set_Length (Handler.Headers.Length + Count_Type (Missing));
end if;
Handler.Headers.Replace_Element (Positive (Column), Value);
end;
else
declare
Name : constant String := Handler.Get_Header_Name (Column);
begin
-- Detect a new row. Close the current object and start a new one.
if Handler.Row /= Row then
if Row > 1 then
Handler.Sink.Finish_Object ("", Handler);
else
Handler.Sink.Start_Array ("", Handler);
end if;
Handler.Sink.Start_Object ("", Handler);
end if;
Handler.Row := Row;
Handler.Sink.Set_Member (Name, Util.Beans.Objects.To_Object (Value), Handler);
end;
end if;
end Set_Cell;
-- ------------------------------
-- Set the field separator. The default field separator is the comma (',').
-- ------------------------------
procedure Set_Field_Separator (Handler : in out Parser;
Separator : in Character) is
begin
Handler.Separator := Separator;
end Set_Field_Separator;
-- ------------------------------
-- Get the field separator.
-- ------------------------------
function Get_Field_Separator (Handler : in Parser) return Character is
begin
return Handler.Separator;
end Get_Field_Separator;
-- ------------------------------
-- Set the comment separator. When a comment separator is defined, a line which starts
-- with the comment separator will be ignored. The row number will not be incremented.
-- ------------------------------
procedure Set_Comment_Separator (Handler : in out Parser;
Separator : in Character) is
begin
Handler.Comment := Separator;
end Set_Comment_Separator;
-- ------------------------------
-- Get the comment separator. Returns ASCII.NUL if comments are not supported.
-- ------------------------------
function Get_Comment_Separator (Handler : in Parser) return Character is
begin
return Handler.Comment;
end Get_Comment_Separator;
-- ------------------------------
-- Setup the CSV parser and mapper to use the default column header names.
-- When activated, the first row is assumed to contain the first item to de-serialize.
-- ------------------------------
procedure Set_Default_Headers (Handler : in out Parser;
Mode : in Boolean := True) is
begin
Handler.Use_Default_Headers := Mode;
end Set_Default_Headers;
-- ------------------------------
-- Parse the stream using the CSV parser.
-- Call <b>Set_Cell</b> for each cell that has been parsed indicating the row and
-- column numbers as well as the cell value.
-- ------------------------------
overriding
procedure Parse (Handler : in out Parser;
Stream : in out Util.Streams.Buffered.Input_Buffer_Stream'Class;
Sink : in out Reader'Class) is
use Ada.Strings.Unbounded;
C : Character;
Token : Unbounded_String;
Column : Column_Type := 1;
Row : Row_Type := 0;
In_Quote_Token : Boolean := False;
In_Escape : Boolean := False;
Ignore_Row : Boolean := False;
begin
if Handler.Use_Default_Headers then
Row := 1;
end if;
Handler.Headers.Clear;
Handler.Sink := Sink'Unchecked_Access;
loop
Stream.Read (Char => C);
if C = Ada.Characters.Latin_1.CR or C = Ada.Characters.Latin_1.LF then
if C = Ada.Characters.Latin_1.LF then
Handler.Line_Number := Handler.Line_Number + 1;
end if;
if not Ignore_Row then
if In_Quote_Token and not In_Escape then
Append (Token, C);
elsif Column > 1 or else Length (Token) > 0 then
Parser'Class (Handler).Set_Cell (To_String (Token), Row, Column);
Set_Unbounded_String (Token, "");
Row := Row + 1;
Column := 1;
In_Quote_Token := False;
In_Escape := False;
end if;
else
Ignore_Row := False;
end if;
elsif C = Handler.Separator and not Ignore_Row then
if In_Quote_Token and not In_Escape then
Append (Token, C);
else
Parser'Class (Handler).Set_Cell (To_String (Token), Row, Column);
Set_Unbounded_String (Token, "");
Column := Column + 1;
In_Quote_Token := False;
In_Escape := False;
end if;
elsif C = '"' and not Ignore_Row then
if In_Quote_Token then
In_Escape := True;
elsif In_Escape then
Append (Token, C);
In_Escape := False;
elsif Ada.Strings.Unbounded.Length (Token) = 0 then
In_Quote_Token := True;
else
Append (Token, C);
end if;
elsif C = Handler.Comment and Handler.Comment /= ASCII.NUL
and Column = 1 and Length (Token) = 0
then
Ignore_Row := True;
elsif not Ignore_Row then
Append (Token, C);
In_Escape := False;
end if;
end loop;
exception
when Ada.IO_Exceptions.Data_Error =>
Parser'Class (Handler).Set_Cell (To_String (Token), Row, Column);
Handler.Sink := null;
return;
end Parse;
-- ------------------------------
-- Get the current location (file and line) to report an error message.
-- ------------------------------
overriding
function Get_Location (Handler : in Parser) return String is
begin
return Util.Strings.Image (Handler.Line_Number);
end Get_Location;
end Util.Serialize.IO.CSV;
| 34.122772 | 97 | 0.522864 |
4b34762be6e3f8c8a849c1d65682b95b8aea997a | 1,806 | ads | Ada | tier-1/clib/source/thin/clib-binding.ads | charlie5/cBound | 741be08197a61ad9c72553e3302f3b669902216d | [
"0BSD"
] | 2 | 2015-11-12T11:16:20.000Z | 2021-08-24T22:32:04.000Z | tier-1/clib/source/thin/clib-binding.ads | charlie5/cBound | 741be08197a61ad9c72553e3302f3b669902216d | [
"0BSD"
] | 1 | 2018-06-05T05:19:35.000Z | 2021-11-20T01:13:23.000Z | tier-1/clib/source/thin/clib-binding.ads | charlie5/cBound | 741be08197a61ad9c72553e3302f3b669902216d | [
"0BSD"
] | null | null | null | -- This file is generated by SWIG. Please do *not* modify by hand.
--
with Interfaces.C;
with clib.lconv;
with Interfaces.C.Pointers;
with Interfaces.C.Strings;
with System;
package clib.Binding is
function setlocale
(a_a_category : in Interfaces.C.int;
a_a_locale : in Interfaces.C.Strings.chars_ptr)
return Interfaces.C.Strings.chars_ptr;
function localeconv return access clib.lconv.Item;
function lc_CTYPE return Interfaces.C.int;
function lc_NUMERIC return Interfaces.C.int;
function lc_TIME return Interfaces.C.int;
function lc_COLLATE return Interfaces.C.int;
function lc_MONETARY return Interfaces.C.int;
function lc_MESSAGES return Interfaces.C.int;
function lc_ALL return Interfaces.C.int;
function lc_PAPER return Interfaces.C.int;
function lc_NAME return Interfaces.C.int;
function lc_ADDRESS return Interfaces.C.int;
function lc_TELEPHONE return Interfaces.C.int;
function lc_MEASUREMENT return Interfaces.C.int;
function lc_IDENTIFICATION return Interfaces.C.int;
private
pragma Import (C, setlocale, "setlocale");
pragma Import (C, localeconv, "localeconv");
pragma Import (C, lc_CTYPE, "lc_CTYPE");
pragma Import (C, lc_NUMERIC, "lc_NUMERIC");
pragma Import (C, lc_TIME, "lc_TIME");
pragma Import (C, lc_COLLATE, "lc_COLLATE");
pragma Import (C, lc_MONETARY, "lc_MONETARY");
pragma Import (C, lc_MESSAGES, "lc_MESSAGES");
pragma Import (C, lc_ALL, "lc_ALL");
pragma Import (C, lc_PAPER, "lc_PAPER");
pragma Import (C, lc_NAME, "lc_NAME");
pragma Import (C, lc_ADDRESS, "lc_ADDRESS");
pragma Import (C, lc_TELEPHONE, "lc_TELEPHONE");
pragma Import (C, lc_MEASUREMENT, "lc_MEASUREMENT");
pragma Import (C, lc_IDENTIFICATION, "lc_IDENTIFICATION");
end clib.Binding;
| 29.129032 | 66 | 0.732004 |
293ede87417beae1d6e663125a8abf80c274fab2 | 8,025 | ads | Ada | Validation/pyFrame3DD-master/gcc-master/gcc/ada/libgnat/system-vxworks7-x86-rtp-smp.ads | djamal2727/Main-Bearing-Analytical-Model | 2f00c2219c71be0175c6f4f8f1d4cca231d97096 | [
"Apache-2.0"
] | null | null | null | Validation/pyFrame3DD-master/gcc-master/gcc/ada/libgnat/system-vxworks7-x86-rtp-smp.ads | djamal2727/Main-Bearing-Analytical-Model | 2f00c2219c71be0175c6f4f8f1d4cca231d97096 | [
"Apache-2.0"
] | null | null | null | Validation/pyFrame3DD-master/gcc-master/gcc/ada/libgnat/system-vxworks7-x86-rtp-smp.ads | djamal2727/Main-Bearing-Analytical-Model | 2f00c2219c71be0175c6f4f8f1d4cca231d97096 | [
"Apache-2.0"
] | null | null | null | ------------------------------------------------------------------------------
-- --
-- GNAT RUN-TIME COMPONENTS --
-- --
-- S Y S T E M --
-- --
-- S p e c --
-- (VxWorks 7 Version x86 for RTPs) --
-- --
-- Copyright (C) 1992-2020, Free Software Foundation, Inc. --
-- --
-- This specification is derived from the Ada Reference Manual for use with --
-- GNAT. The copyright notice above, and the license provisions that follow --
-- apply solely to the contents of the part following the private keyword. --
-- --
-- GNAT is free software; you can redistribute it and/or modify it under --
-- terms of the GNU General Public License as published by the Free Soft- --
-- ware Foundation; either version 3, or (at your option) any later ver- --
-- sion. GNAT is distributed in the hope that it will be useful, but WITH- --
-- OUT ANY WARRANTY; without even the implied warranty of MERCHANTABILITY --
-- or FITNESS FOR A PARTICULAR PURPOSE. --
-- --
-- As a special exception under Section 7 of GPL version 3, you are granted --
-- additional permissions described in the GCC Runtime Library Exception, --
-- version 3.1, as published by the Free Software Foundation. --
-- --
-- You should have received a copy of the GNU General Public License and --
-- a copy of the GCC Runtime Library Exception along with this program; --
-- see the files COPYING3 and COPYING.RUNTIME respectively. If not, see --
-- <http://www.gnu.org/licenses/>. --
-- --
-- GNAT was originally developed by the GNAT team at New York University. --
-- Extensive contributions were provided by Ada Core Technologies Inc. --
-- --
------------------------------------------------------------------------------
package System is
pragma Pure;
-- Note that we take advantage of the implementation permission to make
-- this unit Pure instead of Preelaborable; see RM 13.7.1(15). In Ada
-- 2005, this is Pure in any case (AI-362).
pragma No_Elaboration_Code_All;
-- Allow the use of that restriction in units that WITH this unit
type Name is (SYSTEM_NAME_GNAT);
System_Name : constant Name := SYSTEM_NAME_GNAT;
-- System-Dependent Named Numbers
Min_Int : constant := -2 ** (Standard'Max_Integer_Size - 1);
Max_Int : constant := 2 ** (Standard'Max_Integer_Size - 1) - 1;
Max_Binary_Modulus : constant := 2 ** Standard'Max_Integer_Size;
Max_Nonbinary_Modulus : constant := 2 ** Integer'Size - 1;
Max_Base_Digits : constant := Long_Long_Float'Digits;
Max_Digits : constant := Long_Long_Float'Digits;
Max_Mantissa : constant := 63;
Fine_Delta : constant := 2.0 ** (-Max_Mantissa);
Tick : constant := 1.0 / 60.0;
-- Storage-related Declarations
type Address is private;
pragma Preelaborable_Initialization (Address);
Null_Address : constant Address;
Storage_Unit : constant := 8;
Word_Size : constant := 32;
Memory_Size : constant := 2 ** 32;
-- Address comparison
function "<" (Left, Right : Address) return Boolean;
function "<=" (Left, Right : Address) return Boolean;
function ">" (Left, Right : Address) return Boolean;
function ">=" (Left, Right : Address) return Boolean;
function "=" (Left, Right : Address) return Boolean;
pragma Import (Intrinsic, "<");
pragma Import (Intrinsic, "<=");
pragma Import (Intrinsic, ">");
pragma Import (Intrinsic, ">=");
pragma Import (Intrinsic, "=");
-- Other System-Dependent Declarations
type Bit_Order is (High_Order_First, Low_Order_First);
Default_Bit_Order : constant Bit_Order := Low_Order_First;
pragma Warnings (Off, Default_Bit_Order); -- kill constant condition warning
-- Priority-related Declarations (RM D.1)
-- Ada priorities are mapped to VxWorks priorities using the following
-- transformation: 255 - Ada Priority
-- Ada priorities are used as follows:
-- 256 is reserved for the VxWorks kernel
-- 248 - 255 correspond to hardware interrupt levels 0 .. 7
-- 247 is a catchall default "interrupt" priority for signals,
-- allowing higher priority than normal tasks, but lower than
-- hardware priority levels. Protected Object ceilings can
-- override these values.
-- 246 is used by the Interrupt_Manager task
Max_Priority : constant Positive := 245;
Max_Interrupt_Priority : constant Positive := 255;
subtype Any_Priority is Integer range 0 .. 255;
subtype Priority is Any_Priority range 0 .. 245;
subtype Interrupt_Priority is Any_Priority range 246 .. 255;
Default_Priority : constant Priority := 122;
private
pragma Linker_Options ("--specs=vxworks7-x86-rtp-base-link.spec");
-- Define the symbol wrs_rtp_base
type Address is mod Memory_Size;
Null_Address : constant Address := 0;
--------------------------------------
-- System Implementation Parameters --
--------------------------------------
-- These parameters provide information about the target that is used
-- by the compiler. They are in the private part of System, where they
-- can be accessed using the special circuitry in the Targparm unit
-- whose source should be consulted for more detailed descriptions
-- of the individual switch values.
Backend_Divide_Checks : constant Boolean := False;
Backend_Overflow_Checks : constant Boolean := True;
Command_Line_Args : constant Boolean := True;
Configurable_Run_Time : constant Boolean := False;
Denorm : constant Boolean := True;
Duration_32_Bits : constant Boolean := False;
Exit_Status_Supported : constant Boolean := True;
Fractional_Fixed_Ops : constant Boolean := False;
Frontend_Layout : constant Boolean := False;
Machine_Overflows : constant Boolean := False;
Machine_Rounds : constant Boolean := True;
Preallocated_Stacks : constant Boolean := False;
Signed_Zeros : constant Boolean := True;
Stack_Check_Default : constant Boolean := False;
Stack_Check_Probes : constant Boolean := True;
Stack_Check_Limits : constant Boolean := False;
Support_Aggregates : constant Boolean := True;
Support_Atomic_Primitives : constant Boolean := True;
Support_Composite_Assign : constant Boolean := True;
Support_Composite_Compare : constant Boolean := True;
Support_Long_Shifts : constant Boolean := True;
Always_Compatible_Rep : constant Boolean := False;
Suppress_Standard_Library : constant Boolean := False;
Use_Ada_Main_Program_Name : constant Boolean := False;
Frontend_Exceptions : constant Boolean := False;
ZCX_By_Default : constant Boolean := True;
Executable_Extension : constant String := ".vxe";
end System;
| 48.053892 | 79 | 0.561994 |
4b9bbe4b9b36463859a38b9cbebe92ae36c9232e | 2,202 | adb | Ada | regtests/openapi-clients-tests.adb | mgrojo/swagger-ada | ba592a8c9cd76304bef8f1d48738069b8c73b4a6 | [
"Apache-2.0"
] | null | null | null | regtests/openapi-clients-tests.adb | mgrojo/swagger-ada | ba592a8c9cd76304bef8f1d48738069b8c73b4a6 | [
"Apache-2.0"
] | null | null | null | regtests/openapi-clients-tests.adb | mgrojo/swagger-ada | ba592a8c9cd76304bef8f1d48738069b8c73b4a6 | [
"Apache-2.0"
] | null | null | null | -----------------------------------------------------------------------
-- openapi-clients-tests -- Unit tests for clients
-- Copyright (C) 2017, 2022 Stephane Carrez
-- Written by Stephane Carrez ([email protected])
--
-- Licensed under the Apache License, Version 2.0 (the "License");
-- you may not use this file except in compliance with the License.
-- You may obtain a copy of the License at
--
-- http://www.apache.org/licenses/LICENSE-2.0
--
-- Unless required by applicable law or agreed to in writing, software
-- distributed under the License is distributed on an "AS IS" BASIS,
-- WITHOUT WARRANTIES OR CONDITIONS OF ANY KIND, either express or implied.
-- See the License for the specific language governing permissions and
-- limitations under the License.
-----------------------------------------------------------------------
with Util.Test_Caller;
package body OpenAPI.Clients.Tests is
package Caller is new Util.Test_Caller (Test, "OpenAPI.Clients");
procedure Add_Tests (Suite : in Util.Tests.Access_Test_Suite) is
begin
Caller.Add_Test (Suite, "Test OpenAPI.Clients.Set_Path",
Test_Set_Path'Access);
Caller.Add_Test (Suite, "Test OpenAPI.Clients.Add_Param",
Test_Add_Param'Access);
end Add_Tests;
-- ------------------------------
-- Test Set_Path operations.
-- ------------------------------
procedure Test_Set_Path (T : in out Test) is
URI : URI_Type;
begin
URI.Set_Path ("/admin/{user}");
URI.Set_Path_Param ("user", "admin");
Util.Tests.Assert_Equals (T, "/admin/admin", URI.To_String,
"To_String on URI is invalid");
end Test_Set_Path;
-- ------------------------------
-- Test Add_Param operations.
-- ------------------------------
procedure Test_Add_Param (T : in out Test) is
URI : URI_Type;
begin
URI.Set_Path ("/admin/list");
URI.Add_Param ("status", "active");
Util.Tests.Assert_Equals (T, "/admin/list?status=active", URI.To_String,
"To_String on URI is invalid");
end Test_Add_Param;
end OpenAPI.Clients.Tests;
| 37.965517 | 78 | 0.577203 |
135798e031588ee62903f856ad2654a301c71f04 | 5,897 | ads | Ada | tools/scitools/conf/understand/ada/ada12/g-sse.ads | brucegua/moocos | 575c161cfa35e220f10d042e2e5ca18773691695 | [
"Apache-2.0"
] | 1 | 2020-01-20T21:26:46.000Z | 2020-01-20T21:26:46.000Z | tools/scitools/conf/understand/ada/ada12/g-sse.ads | brucegua/moocos | 575c161cfa35e220f10d042e2e5ca18773691695 | [
"Apache-2.0"
] | null | null | null | tools/scitools/conf/understand/ada/ada12/g-sse.ads | brucegua/moocos | 575c161cfa35e220f10d042e2e5ca18773691695 | [
"Apache-2.0"
] | null | null | null | ------------------------------------------------------------------------------
-- --
-- GNAT COMPILER COMPONENTS --
-- --
-- G N A T . S S E --
-- --
-- S p e c --
-- --
-- Copyright (C) 2009-2012, Free Software Foundation, Inc. --
-- --
-- GNAT is free software; you can redistribute it and/or modify it under --
-- terms of the GNU General Public License as published by the Free Soft- --
-- ware Foundation; either version 3, or (at your option) any later ver- --
-- sion. GNAT is distributed in the hope that it will be useful, but WITH- --
-- OUT ANY WARRANTY; without even the implied warranty of MERCHANTABILITY --
-- or FITNESS FOR A PARTICULAR PURPOSE. --
-- --
-- --
-- --
-- --
-- --
-- You should have received a copy of the GNU General Public License and --
-- a copy of the GCC Runtime Library Exception along with this program; --
-- see the files COPYING3 and COPYING.RUNTIME respectively. If not, see --
-- <http://www.gnu.org/licenses/>. --
-- --
-- GNAT was originally developed by the GNAT team at New York University. --
-- Extensive contributions were provided by Ada Core Technologies Inc. --
-- --
------------------------------------------------------------------------------
-- This package is the root of a set aimed at offering Ada bindings to a
-- subset of the Intel(r) Streaming SIMD Extensions with GNAT. The purpose
-- is to allow access from Ada to the SSE facilities defined in the Intel(r)
-- compiler manuals, in particular in the Intrinsics Reference of the C++
-- Compiler User's Guide, available from http://www.intel.com.
-- Assuming actual hardware support is available, this capability is
-- currently supported on the following set of targets:
-- GNU/Linux x86 and x86_64
-- Windows XP/Vista x86 and x86_64
-- Solaris x86
-- Darwin x86_64
-- This unit exposes vector _component_ types together with general comments
-- on the binding contents.
-- One other unit is offered as of today: GNAT.SSE.Vector_Types, which
-- exposes Ada types corresponding to the reference types (__m128 and the
-- like) over which a binding to the SSE GCC builtins may operate.
-- The exposed Ada types are private. Object initializations or value
-- observations may be performed with unchecked conversions or address
-- overlays, for example:
-- with Ada.Unchecked_Conversion;
-- with GNAT.SSE.Vector_Types; use GNAT.SSE, GNAT.SSE.Vector_Types;
-- procedure SSE_Base is
-- -- Core operations
-- function ia32_addps (A, B : m128) return m128;
-- pragma Import (Intrinsic, ia32_addps, "__builtin_ia32_addps");
-- -- User views & conversions
-- type Vf32_View is array (1 .. 4) of GNAT.SSE.Float32;
-- for Vf32_View'Alignment use VECTOR_ALIGN;
-- function To_m128 is new Ada.Unchecked_Conversion (Vf32_View, m128);
-- Xf32 : constant Vf32_View := (1.0, 1.0, 2.0, 2.0);
-- Yf32 : constant Vf32_View := (2.0, 2.0, 1.0, 1.0);
-- X128 : constant m128 := To_m128 (Xf32);
-- Y128 : constant m128 := To_m128 (Yf32);
-- begin
-- -- Operations & overlays
-- declare
-- Z128 : m128;
-- Zf32 : Vf32_View;
-- for Zf32'Address use Z128'Address;
-- begin
-- Z128 := ia32_addps (X128, Y128);
-- if Zf32 /= (3.0, 3.0, 3.0, 3.0) then
-- raise Program_Error;
-- end if;
-- end;
-- declare
-- type m128_View_Kind is (SSE, F32);
-- type m128_Object (View : m128_View_Kind := F32) is record
-- case View is
-- when SSE => V128 : m128;
-- when F32 => Vf32 : Vf32_View;
-- end case;
-- end record;
-- pragma Unchecked_Union (m128_Object);
-- O1 : constant m128_Object := (View => SSE, V128 => X128);
-- begin
-- if O1.Vf32 /= Xf32 then
-- raise Program_Error;
-- end if;
-- end;
-- end SSE_Base;
package GNAT.SSE is
-----------------------------------
-- Common vector characteristics --
-----------------------------------
VECTOR_BYTES : constant := 16;
-- Common size of all the SSE vector types, in bytes.
VECTOR_ALIGN : constant := 16;
-- Common alignment of all the SSE vector types, in bytes.
-- Alignment-wise, the reference document reads:
-- << The compiler aligns __m128d and _m128i local and global data to
-- 16-byte boundaries on the stack. >>
--
-- We apply that consistently to all the Ada vector types, as GCC does
-- for the corresponding C types.
----------------------------
-- Vector component types --
----------------------------
type Float32 is new Float;
type Float64 is new Long_Float;
type Integer64 is new Long_Long_Integer;
end GNAT.SSE;
| 42.121429 | 78 | 0.48601 |
9a1b841cafaef0b7bbbff4828420185bb7673635 | 51 | ads | Ada | specs/ada/common/tkmrpc-transport.ads | DrenfongWong/tkm-rpc | 075d22871cf81d497aac656c7f03a513278b641c | [
"BSD-3-Clause"
] | null | null | null | specs/ada/common/tkmrpc-transport.ads | DrenfongWong/tkm-rpc | 075d22871cf81d497aac656c7f03a513278b641c | [
"BSD-3-Clause"
] | null | null | null | specs/ada/common/tkmrpc-transport.ads | DrenfongWong/tkm-rpc | 075d22871cf81d497aac656c7f03a513278b641c | [
"BSD-3-Clause"
] | null | null | null | package Tkmrpc.Transport is
end Tkmrpc.Transport;
| 12.75 | 27 | 0.823529 |
59b1f6e89a88efb85f812f6b2f1c12341ebd1c25 | 90 | ada | Ada | Task/Loops-Do-while/Ada/loops-do-while-2.ada | mullikine/RosettaCodeData | 4f0027c6ce83daa36118ee8b67915a13cd23ab67 | [
"Info-ZIP"
] | 1 | 2018-11-09T22:08:38.000Z | 2018-11-09T22:08:38.000Z | Task/Loops-Do-while/Ada/loops-do-while-2.ada | mullikine/RosettaCodeData | 4f0027c6ce83daa36118ee8b67915a13cd23ab67 | [
"Info-ZIP"
] | null | null | null | Task/Loops-Do-while/Ada/loops-do-while-2.ada | mullikine/RosettaCodeData | 4f0027c6ce83daa36118ee8b67915a13cd23ab67 | [
"Info-ZIP"
] | 1 | 2018-11-09T22:08:40.000Z | 2018-11-09T22:08:40.000Z | for Value in 0..Integer'Last loop
Put (Value);
exit when Value mod 6 = 0;
end loop;
| 18 | 33 | 0.655556 |
4b99406c4637e01e8366a16217af726a8fce6905 | 3,662 | ads | Ada | source/amf/uml/amf-umldi-uml_interaction_table_labels-hash.ads | svn2github/matreshka | 9d222b3ad9da508855fb1f5adbe5e8a4fad4c530 | [
"BSD-3-Clause"
] | 24 | 2016-11-29T06:59:41.000Z | 2021-08-30T11:55:16.000Z | source/amf/uml/amf-umldi-uml_interaction_table_labels-hash.ads | svn2github/matreshka | 9d222b3ad9da508855fb1f5adbe5e8a4fad4c530 | [
"BSD-3-Clause"
] | 2 | 2019-01-16T05:15:20.000Z | 2019-02-03T10:03:32.000Z | source/amf/uml/amf-umldi-uml_interaction_table_labels-hash.ads | svn2github/matreshka | 9d222b3ad9da508855fb1f5adbe5e8a4fad4c530 | [
"BSD-3-Clause"
] | 4 | 2017-07-18T07:11:05.000Z | 2020-06-21T03:02:25.000Z | ------------------------------------------------------------------------------
-- --
-- Matreshka Project --
-- --
-- Ada Modeling Framework --
-- --
-- Runtime Library Component --
-- --
------------------------------------------------------------------------------
-- --
-- Copyright © 2011-2012, Vadim Godunko <[email protected]> --
-- All rights reserved. --
-- --
-- Redistribution and use in source and binary forms, with or without --
-- modification, are permitted provided that the following conditions --
-- are met: --
-- --
-- * Redistributions of source code must retain the above copyright --
-- notice, this list of conditions and the following disclaimer. --
-- --
-- * Redistributions in binary form must reproduce the above copyright --
-- notice, this list of conditions and the following disclaimer in the --
-- documentation and/or other materials provided with the distribution. --
-- --
-- * Neither the name of the Vadim Godunko, IE nor the names of its --
-- contributors may be used to endorse or promote products derived from --
-- this software without specific prior written permission. --
-- --
-- THIS SOFTWARE IS PROVIDED BY THE COPYRIGHT HOLDERS AND CONTRIBUTORS --
-- "AS IS" AND ANY EXPRESS OR IMPLIED WARRANTIES, INCLUDING, BUT NOT --
-- LIMITED TO, THE IMPLIED WARRANTIES OF MERCHANTABILITY AND FITNESS FOR --
-- A PARTICULAR PURPOSE ARE DISCLAIMED. IN NO EVENT SHALL THE COPYRIGHT --
-- HOLDER OR CONTRIBUTORS BE LIABLE FOR ANY DIRECT, INDIRECT, INCIDENTAL, --
-- SPECIAL, EXEMPLARY, OR CONSEQUENTIAL DAMAGES (INCLUDING, BUT NOT LIMITED --
-- TO, PROCUREMENT OF SUBSTITUTE GOODS OR SERVICES; LOSS OF USE, DATA, OR --
-- PROFITS; OR BUSINESS INTERRUPTION) HOWEVER CAUSED AND ON ANY THEORY OF --
-- LIABILITY, WHETHER IN CONTRACT, STRICT LIABILITY, OR TORT (INCLUDING --
-- NEGLIGENCE OR OTHERWISE) ARISING IN ANY WAY OUT OF THE USE OF THIS --
-- SOFTWARE, EVEN IF ADVISED OF THE POSSIBILITY OF SUCH DAMAGE. --
-- --
------------------------------------------------------------------------------
-- $Revision$ $Date$
------------------------------------------------------------------------------
-- This file is generated, don't edit it.
------------------------------------------------------------------------------
with AMF.Elements.Generic_Hash;
function AMF.UMLDI.UML_Interaction_Table_Labels.Hash is
new AMF.Elements.Generic_Hash (UMLDI_UML_Interaction_Table_Label, UMLDI_UML_Interaction_Table_Label_Access);
| 73.24 | 110 | 0.410705 |
3d1a16bb692cf26fa3683b036fb839ab2398d64e | 5,129 | ads | Ada | source/amf/uml/amf-uml-interaction_uses-collections.ads | svn2github/matreshka | 9d222b3ad9da508855fb1f5adbe5e8a4fad4c530 | [
"BSD-3-Clause"
] | 24 | 2016-11-29T06:59:41.000Z | 2021-08-30T11:55:16.000Z | source/amf/uml/amf-uml-interaction_uses-collections.ads | svn2github/matreshka | 9d222b3ad9da508855fb1f5adbe5e8a4fad4c530 | [
"BSD-3-Clause"
] | 2 | 2019-01-16T05:15:20.000Z | 2019-02-03T10:03:32.000Z | source/amf/uml/amf-uml-interaction_uses-collections.ads | svn2github/matreshka | 9d222b3ad9da508855fb1f5adbe5e8a4fad4c530 | [
"BSD-3-Clause"
] | 4 | 2017-07-18T07:11:05.000Z | 2020-06-21T03:02:25.000Z | ------------------------------------------------------------------------------
-- --
-- Matreshka Project --
-- --
-- Ada Modeling Framework --
-- --
-- Runtime Library Component --
-- --
------------------------------------------------------------------------------
-- --
-- Copyright © 2011-2012, Vadim Godunko <[email protected]> --
-- All rights reserved. --
-- --
-- Redistribution and use in source and binary forms, with or without --
-- modification, are permitted provided that the following conditions --
-- are met: --
-- --
-- * Redistributions of source code must retain the above copyright --
-- notice, this list of conditions and the following disclaimer. --
-- --
-- * Redistributions in binary form must reproduce the above copyright --
-- notice, this list of conditions and the following disclaimer in the --
-- documentation and/or other materials provided with the distribution. --
-- --
-- * Neither the name of the Vadim Godunko, IE nor the names of its --
-- contributors may be used to endorse or promote products derived from --
-- this software without specific prior written permission. --
-- --
-- THIS SOFTWARE IS PROVIDED BY THE COPYRIGHT HOLDERS AND CONTRIBUTORS --
-- "AS IS" AND ANY EXPRESS OR IMPLIED WARRANTIES, INCLUDING, BUT NOT --
-- LIMITED TO, THE IMPLIED WARRANTIES OF MERCHANTABILITY AND FITNESS FOR --
-- A PARTICULAR PURPOSE ARE DISCLAIMED. IN NO EVENT SHALL THE COPYRIGHT --
-- HOLDER OR CONTRIBUTORS BE LIABLE FOR ANY DIRECT, INDIRECT, INCIDENTAL, --
-- SPECIAL, EXEMPLARY, OR CONSEQUENTIAL DAMAGES (INCLUDING, BUT NOT LIMITED --
-- TO, PROCUREMENT OF SUBSTITUTE GOODS OR SERVICES; LOSS OF USE, DATA, OR --
-- PROFITS; OR BUSINESS INTERRUPTION) HOWEVER CAUSED AND ON ANY THEORY OF --
-- LIABILITY, WHETHER IN CONTRACT, STRICT LIABILITY, OR TORT (INCLUDING --
-- NEGLIGENCE OR OTHERWISE) ARISING IN ANY WAY OUT OF THE USE OF THIS --
-- SOFTWARE, EVEN IF ADVISED OF THE POSSIBILITY OF SUCH DAMAGE. --
-- --
------------------------------------------------------------------------------
-- $Revision$ $Date$
------------------------------------------------------------------------------
-- This file is generated, don't edit it.
------------------------------------------------------------------------------
with AMF.Generic_Collections;
package AMF.UML.Interaction_Uses.Collections is
pragma Preelaborate;
package UML_Interaction_Use_Collections is
new AMF.Generic_Collections
(UML_Interaction_Use,
UML_Interaction_Use_Access);
type Set_Of_UML_Interaction_Use is
new UML_Interaction_Use_Collections.Set with null record;
Empty_Set_Of_UML_Interaction_Use : constant Set_Of_UML_Interaction_Use;
type Ordered_Set_Of_UML_Interaction_Use is
new UML_Interaction_Use_Collections.Ordered_Set with null record;
Empty_Ordered_Set_Of_UML_Interaction_Use : constant Ordered_Set_Of_UML_Interaction_Use;
type Bag_Of_UML_Interaction_Use is
new UML_Interaction_Use_Collections.Bag with null record;
Empty_Bag_Of_UML_Interaction_Use : constant Bag_Of_UML_Interaction_Use;
type Sequence_Of_UML_Interaction_Use is
new UML_Interaction_Use_Collections.Sequence with null record;
Empty_Sequence_Of_UML_Interaction_Use : constant Sequence_Of_UML_Interaction_Use;
private
Empty_Set_Of_UML_Interaction_Use : constant Set_Of_UML_Interaction_Use
:= (UML_Interaction_Use_Collections.Set with null record);
Empty_Ordered_Set_Of_UML_Interaction_Use : constant Ordered_Set_Of_UML_Interaction_Use
:= (UML_Interaction_Use_Collections.Ordered_Set with null record);
Empty_Bag_Of_UML_Interaction_Use : constant Bag_Of_UML_Interaction_Use
:= (UML_Interaction_Use_Collections.Bag with null record);
Empty_Sequence_Of_UML_Interaction_Use : constant Sequence_Of_UML_Interaction_Use
:= (UML_Interaction_Use_Collections.Sequence with null record);
end AMF.UML.Interaction_Uses.Collections;
| 55.75 | 90 | 0.528368 |
0434aad42626bc2f3c0a837d168bcb8cdf8fd4d4 | 2,869 | ads | Ada | arch/ARM/STM32/driversWL5x/stm32-setup.ads | morbos/Ada_Drivers_Library | a4ab26799be60997c38735f4056160c4af597ef7 | [
"BSD-3-Clause"
] | 2 | 2018-05-16T03:56:39.000Z | 2019-07-31T13:53:56.000Z | arch/ARM/STM32/driversWL5x/stm32-setup.ads | morbos/Ada_Drivers_Library | a4ab26799be60997c38735f4056160c4af597ef7 | [
"BSD-3-Clause"
] | null | null | null | arch/ARM/STM32/driversWL5x/stm32-setup.ads | morbos/Ada_Drivers_Library | a4ab26799be60997c38735f4056160c4af597ef7 | [
"BSD-3-Clause"
] | null | null | null | ------------------------------------------------------------------------------
-- --
-- Copyright (C) 2017, AdaCore --
-- --
-- Redistribution and use in source and binary forms, with or without --
-- modification, are permitted provided that the following conditions are --
-- met: --
-- 1. Redistributions of source code must retain the above copyright --
-- notice, this list of conditions and the following disclaimer. --
-- 2. Redistributions in binary form must reproduce the above copyright --
-- notice, this list of conditions and the following disclaimer in --
-- the documentation and/or other materials provided with the --
-- distribution. --
-- 3. Neither the name of the copyright holder nor the names of its --
-- contributors may be used to endorse or promote products derived --
-- from this software without specific prior written permission. --
-- --
-- THIS SOFTWARE IS PROVIDED BY THE COPYRIGHT HOLDERS AND CONTRIBUTORS --
-- "AS IS" AND ANY EXPRESS OR IMPLIED WARRANTIES, INCLUDING, BUT NOT --
-- LIMITED TO, THE IMPLIED WARRANTIES OF MERCHANTABILITY AND FITNESS FOR --
-- A PARTICULAR PURPOSE ARE DISCLAIMED. IN NO EVENT SHALL THE COPYRIGHT --
-- HOLDER OR CONTRIBUTORS BE LIABLE FOR ANY DIRECT, INDIRECT, INCIDENTAL, --
-- SPECIAL, EXEMPLARY, OR CONSEQUENTIAL DAMAGES (INCLUDING, BUT NOT --
-- LIMITED TO, PROCUREMENT OF SUBSTITUTE GOODS OR SERVICES; LOSS OF USE, --
-- DATA, OR PROFITS; OR BUSINESS INTERRUPTION) HOWEVER CAUSED AND ON ANY --
-- THEORY OF LIABILITY, WHETHER IN CONTRACT, STRICT LIABILITY, OR TORT --
-- (INCLUDING NEGLIGENCE OR OTHERWISE) ARISING IN ANY WAY OUT OF THE USE --
-- OF THIS SOFTWARE, EVEN IF ADVISED OF THE POSSIBILITY OF SUCH DAMAGE. --
-- --
------------------------------------------------------------------------------
-- This package provides utility sub-program to quicly configure the STM32
-- drivers. The intent factorize code by enabling and configuring device and
-- associated GPIO points with a standard/most common setup.
--
-- The devices are configured for the most common usage, but if you need
-- something more specific you can still do it by directly using
-- confguration sub-programs of the device or reconfigure it after using the
-- standard setup.
package STM32.Setup is
end STM32.Setup;
| 66.72093 | 78 | 0.54932 |
130fcb52c336196efc2573967471cc420144acb6 | 4,537 | adb | Ada | test/wavefiles_test/src/wavefiles_test.adb | Ada-Audio/wavefiles | 8e1162c5b9dc604a835f60be6a78e8f9d3c85052 | [
"MIT"
] | 10 | 2016-02-29T09:35:56.000Z | 2020-05-16T02:55:20.000Z | test/wavefiles_test/src/wavefiles_test.adb | gusthoff/wavefiles | 8e1162c5b9dc604a835f60be6a78e8f9d3c85052 | [
"MIT"
] | null | null | null | test/wavefiles_test/src/wavefiles_test.adb | gusthoff/wavefiles | 8e1162c5b9dc604a835f60be6a78e8f9d3c85052 | [
"MIT"
] | null | null | null | ------------------------------------------------------------------------------
-- --
-- WAVEFILES --
-- --
-- Test application --
-- --
-- The MIT License (MIT) --
-- --
-- Copyright (c) 2015 -- 2020 Gustavo A. Hoffmann --
-- --
-- Permission is hereby granted, free of charge, to any person obtaining --
-- a copy of this software and associated documentation files (the --
-- "Software"), to deal in the Software without restriction, including --
-- without limitation the rights to use, copy, modify, merge, publish, --
-- distribute, sublicense, and / or sell copies of the Software, and to --
-- permit persons to whom the Software is furnished to do so, subject to --
-- the following conditions: --
-- --
-- The above copyright notice and this permission notice shall be --
-- included in all copies or substantial portions of the Software. --
-- --
-- THE SOFTWARE IS PROVIDED "AS IS", WITHOUT WARRANTY OF ANY KIND, --
-- EXPRESS OR IMPLIED, INCLUDING BUT NOT LIMITED TO THE WARRANTIES OF --
-- MERCHANTABILITY, FITNESS FOR A PARTICULAR PURPOSE AND NONINFRINGEMENT. --
-- IN NO EVENT SHALL THE AUTHORS OR COPYRIGHT HOLDERS BE LIABLE FOR ANY --
-- CLAIM, DAMAGES OR OTHER LIABILITY, WHETHER IN AN ACTION OF CONTRACT, --
-- TORT OR OTHERWISE, ARISING FROM, OUT OF OR IN CONNECTION WITH THE --
-- SOFTWARE OR THE USE OR OTHER DEALINGS IN THE SOFTWARE. --
------------------------------------------------------------------------------
with Ada.Command_Line; use Ada.Command_Line;
with Ada.Text_IO; use Ada.Text_IO;
with Wave_Test_Instances; use Wave_Test_Instances;
procedure Wavefiles_Test is
Command_Line_OK : Boolean := False;
procedure Print_Usage;
procedure Print_Usage is
begin
Put_Line ("Usage: " & Command_Name & " <command>");
New_Line;
Put_Line (" info <input_wavefile>");
Put_Line (" copy <input_wavefile> <output_wavefile>");
Put_Line (" compare <ref_wavefile> <dut_wavefile>");
Put_Line (" diff <ref_wavefile> <dut_wavefile> "
& "<diff_wavefile>");
Put_Line (" mix <wavefile_1> <wavefile_1> "
& "<mix_wavefile>");
end Print_Usage;
begin
if Argument_Count >= 1 then
if Argument (1) = "info" and then Argument_Count = 2 then
Command_Line_OK := True;
Put_Line ("Information from: " & Argument (2));
Display_Info_File (Argument (2));
elsif Argument (1) = "copy" and then Argument_Count = 3 then
Command_Line_OK := True;
Put_Line ("Copying from: " & Argument (2));
Put_Line ("Copying to: " & Argument (3));
Copy_File (Argument (2), Argument (3));
elsif Argument (1) = "compare" and then Argument_Count = 3 then
Command_Line_OK := True;
Put_Line ("Reference: " & Argument (2));
Put_Line ("DUT: " & Argument (3));
Compare_Files (Argument (2), Argument (3));
elsif Argument (1) = "diff" and then Argument_Count = 4 then
Command_Line_OK := True;
Put_Line ("Reference: " & Argument (2));
Put_Line ("DUT: " & Argument (3));
Put_Line ("Diff: " & Argument (4));
Diff_Files (Argument (2), Argument (3), Argument (4));
elsif Argument (1) = "mix" and then Argument_Count = 4 then
Command_Line_OK := True;
Put_Line ("Wavefile #1: " & Argument (2));
Put_Line ("Wavefile #2: " & Argument (3));
Put_Line ("Mix file: " & Argument (4));
Mix_Files (Argument (2), Argument (3), Argument (4));
end if;
end if;
if not Command_Line_OK then
Print_Usage;
end if;
end Wavefiles_Test;
| 50.411111 | 78 | 0.484682 |
ad4400e7d5f3c46b210c1ab72f93ef72b96f4dce | 2,871 | ads | Ada | source/strings/a-wichha.ads | ytomino/drake | 4e4bdcd8b8e23a11a29b31d3a8861fdf60090ea2 | [
"MIT"
] | 33 | 2015-04-04T09:19:36.000Z | 2021-11-10T05:33:34.000Z | source/strings/a-wichha.ads | ytomino/drake | 4e4bdcd8b8e23a11a29b31d3a8861fdf60090ea2 | [
"MIT"
] | 8 | 2017-11-14T13:05:07.000Z | 2018-08-09T15:28:49.000Z | source/strings/a-wichha.ads | ytomino/drake | 4e4bdcd8b8e23a11a29b31d3a8861fdf60090ea2 | [
"MIT"
] | 9 | 2015-02-03T17:09:53.000Z | 2021-11-12T01:16:05.000Z | pragma License (Unrestricted);
-- Ada 2012
with Ada.Characters.Handling;
private with Ada.UCD;
package Ada.Wide_Characters.Handling is
-- pragma Pure;
pragma Preelaborate;
-- function Character_Set_Version return String;
Character_Set_Version : constant String;
function Is_Control (Item : Wide_Character) return Boolean
renames Characters.Handling.Overloaded_Is_Control;
function Is_Letter (Item : Wide_Character) return Boolean
renames Characters.Handling.Overloaded_Is_Letter;
function Is_Lower (Item : Wide_Character) return Boolean
renames Characters.Handling.Overloaded_Is_Lower;
function Is_Upper (Item : Wide_Character) return Boolean
renames Characters.Handling.Overloaded_Is_Upper;
function Is_Basic (Item : Wide_Character) return Boolean
renames Characters.Handling.Overloaded_Is_Basic;
-- Note: Wide_Characters.Handling.Is_Basic is incompatible with
-- Characters.Handling.Is_Basic. See AI12-0260-1.
function Is_Digit (Item : Wide_Character) return Boolean
renames Characters.Handling.Overloaded_Is_Digit;
function Is_Decimal_Digit (Item : Wide_Character) return Boolean
renames Is_Digit;
function Is_Hexadecimal_Digit (Item : Wide_Character) return Boolean
renames Characters.Handling.Overloaded_Is_Hexadecimal_Digit;
function Is_Alphanumeric (Item : Wide_Character) return Boolean
renames Characters.Handling.Overloaded_Is_Alphanumeric;
function Is_Special (Item : Wide_Character) return Boolean
renames Characters.Handling.Overloaded_Is_Special;
-- function Is_Line_Terminator (Item : Wide_Character) return Boolean;
-- function Is_Mark (Item : Wide_Character) return Boolean;
-- function Is_Other_Format (Item : Wide_Character) return Boolean;
-- function Is_Punctuation_Connector (Item : Wide_Character) return Boolean;
-- function Is_Space (Item : Wide_Character) return Boolean;
function Is_Graphic (Item : Wide_Character) return Boolean
renames Characters.Handling.Overloaded_Is_Graphic;
function To_Lower (Item : Wide_Character) return Wide_Character
renames Characters.Handling.Overloaded_To_Lower;
function To_Upper (Item : Wide_Character) return Wide_Character
renames Characters.Handling.Overloaded_To_Upper;
function To_Basic (Item : Wide_Character) return Wide_Character
renames Characters.Handling.Overloaded_To_Basic;
function To_Lower (Item : Wide_String) return Wide_String
renames Characters.Handling.Overloaded_To_Lower;
function To_Upper (Item : Wide_String) return Wide_String
renames Characters.Handling.Overloaded_To_Upper;
function To_Basic (Item : Wide_String) return Wide_String
renames Characters.Handling.Overloaded_To_Basic;
private
Character_Set_Version : constant String := UCD.Version;
end Ada.Wide_Characters.Handling;
| 36.341772 | 77 | 0.785092 |
38cdfa4387e3534857653ea188f05e30d383c948 | 1,407 | ads | Ada | src/smk-files-put.ads | LionelDraghi/smk | 2ba79048e1d2579bbbdd1004a78c5cff1796261e | [
"Apache-2.0"
] | 10 | 2018-11-27T22:07:50.000Z | 2020-04-12T21:00:03.000Z | src/smk-files-put.ads | LionelDraghi/smk | 2ba79048e1d2579bbbdd1004a78c5cff1796261e | [
"Apache-2.0"
] | 18 | 2018-11-27T22:11:06.000Z | 2019-01-25T20:52:49.000Z | src/smk-files-put.ads | LionelDraghi/smk | 2ba79048e1d2579bbbdd1004a78c5cff1796261e | [
"Apache-2.0"
] | 1 | 2018-12-05T23:05:05.000Z | 2018-12-05T23:05:05.000Z | -- -----------------------------------------------------------------------------
-- smk, the smart make (http://lionel.draghi.free.fr/smk/)
-- © 2018, 2019 Lionel Draghi <[email protected]>
-- SPDX-License-Identifier: APSL-2.0
-- -----------------------------------------------------------------------------
-- Licensed under the Apache License, Version 2.0 (the "License");
-- you may not use this file except in compliance with the License.
-- You may obtain a copy of the License at
-- http://www.apache.org/licenses/LICENSE-2.0
-- Unless required by applicable law or agreed to in writing, software
-- distributed under the License is distributed on an "AS IS" BASIS,
-- WITHOUT WARRANTIES OR CONDITIONS OF ANY KIND, either express or implied.
-- See the License for the specific language governing permissions and
-- limitations under the License.
-- -----------------------------------------------------------------------------
with Smk.Files.File_Lists;
procedure Smk.Files.Put (File_List : File_Lists.Map;
Prefix : String := "";
Print_Sources : Boolean := False;
Print_Targets : Boolean := False;
Print_Unused : Boolean := False);
-- Print files matching one of the boolean, in a one per line way.
-- If Settings.Filter_System_Files, then ignore
-- /lib /usr /etc /opt etc. files
| 52.111111 | 80 | 0.55366 |
9ae946fc1e530e15aaf621d17a0efe723e905df8 | 217 | ads | Ada | generated/natools-static_maps-web-sites-t.ads | faelys/natools-web | f7ba99f2ffb6f5a06d1b1e8becbf5f92fd58c750 | [
"0BSD"
] | 1 | 2015-04-23T10:48:58.000Z | 2015-04-23T10:48:58.000Z | generated/natools-static_maps-web-sites-t.ads | faelys/natools-web | f7ba99f2ffb6f5a06d1b1e8becbf5f92fd58c750 | [
"0BSD"
] | null | null | null | generated/natools-static_maps-web-sites-t.ads | faelys/natools-web | f7ba99f2ffb6f5a06d1b1e8becbf5f92fd58c750 | [
"0BSD"
] | null | null | null | -- Generated at 2017-03-29 14:57:31 +0000 by Natools.Static_Hash_Maps
-- from src/natools-web-sites-maps.sx
function Natools.Static_Maps.Web.Sites.T
return Boolean;
pragma Pure (Natools.Static_Maps.Web.Sites.T);
| 31 | 70 | 0.769585 |
04469ab9e240e4175306ec4c4ee6bf86dff188d8 | 662 | ads | Ada | src/templates/ada/mdm-object.ads | joffreyhuguet/LmcpGen | 3a75248e536f1147d9208ec021cc5105206c3477 | [
"NASA-1.3"
] | null | null | null | src/templates/ada/mdm-object.ads | joffreyhuguet/LmcpGen | 3a75248e536f1147d9208ec021cc5105206c3477 | [
"NASA-1.3"
] | null | null | null | src/templates/ada/mdm-object.ads | joffreyhuguet/LmcpGen | 3a75248e536f1147d9208ec021cc5105206c3477 | [
"NASA-1.3"
] | null | null | null | with avtas.lmcp.byteBuffers; use avtas.lmcp.byteBuffers;
package -<full_series_name_dots>-.object is
type Object is abstract new avtas.lmcp.object.Object with private;
type Object_Acc is access all Object;
type Object_Any is access all Object'Class;
overriding function getSeriesVersion(this : Object) return UInt16 is (-<series_version>-);
overriding function getSeriesName(this : Object) return String is ("-<series_name>-");
overriding function getSeriesNameAsLong(this : Object) return Int64 is (-<series_id>-);
private
type Object is abstract new avtas.lmcp.object.Object with null record;
end -<full_series_name_dots>-.object;
| 34.842105 | 93 | 0.765861 |
38bd209776f430d3fde3a76b67e8c8bef7593d4b | 9,265 | ads | Ada | arch/ARM/STM32/svd/stm32l4x6/stm32_svd-opamp.ads | morbos/Ada_Drivers_Library | a4ab26799be60997c38735f4056160c4af597ef7 | [
"BSD-3-Clause"
] | 2 | 2018-05-16T03:56:39.000Z | 2019-07-31T13:53:56.000Z | arch/ARM/STM32/svd/stm32l4x6/stm32_svd-opamp.ads | morbos/Ada_Drivers_Library | a4ab26799be60997c38735f4056160c4af597ef7 | [
"BSD-3-Clause"
] | null | null | null | arch/ARM/STM32/svd/stm32l4x6/stm32_svd-opamp.ads | morbos/Ada_Drivers_Library | a4ab26799be60997c38735f4056160c4af597ef7 | [
"BSD-3-Clause"
] | null | null | null | -- This spec has been automatically generated from STM32L4x6.svd
pragma Restrictions (No_Elaboration_Code);
pragma Ada_2012;
pragma Style_Checks (Off);
with HAL;
with System;
package STM32_SVD.OPAMP is
pragma Preelaborate;
---------------
-- Registers --
---------------
subtype OPAMP1_CSR_OPAMODE_Field is HAL.UInt2;
subtype OPAMP1_CSR_PGA_GAIN_Field is HAL.UInt2;
subtype OPAMP1_CSR_VM_SEL_Field is HAL.UInt2;
-- OPAMP1 control/status register
type OPAMP1_CSR_Register is record
-- Operational amplifier Enable
OPAEN : Boolean := False;
-- Operational amplifier Low Power Mode
OPALPM : Boolean := False;
-- Operational amplifier PGA mode
OPAMODE : OPAMP1_CSR_OPAMODE_Field := 16#0#;
-- Operational amplifier Programmable amplifier gain value
PGA_GAIN : OPAMP1_CSR_PGA_GAIN_Field := 16#0#;
-- unspecified
Reserved_6_7 : HAL.UInt2 := 16#0#;
-- Inverting input selection
VM_SEL : OPAMP1_CSR_VM_SEL_Field := 16#0#;
-- Non inverted input selection
VP_SEL : Boolean := False;
-- unspecified
Reserved_11_11 : HAL.Bit := 16#0#;
-- Calibration mode enabled
CALON : Boolean := False;
-- Calibration selection
CALSEL : Boolean := False;
-- allows to switch from AOP offset trimmed values to AOP offset
USERTRIM : Boolean := False;
-- Operational amplifier calibration output
CALOUT : Boolean := False;
-- unspecified
Reserved_16_30 : HAL.UInt15 := 16#0#;
-- Operational amplifier power supply range for stability
OPA_RANGE : Boolean := False;
end record
with Volatile_Full_Access, Size => 32,
Bit_Order => System.Low_Order_First;
for OPAMP1_CSR_Register use record
OPAEN at 0 range 0 .. 0;
OPALPM at 0 range 1 .. 1;
OPAMODE at 0 range 2 .. 3;
PGA_GAIN at 0 range 4 .. 5;
Reserved_6_7 at 0 range 6 .. 7;
VM_SEL at 0 range 8 .. 9;
VP_SEL at 0 range 10 .. 10;
Reserved_11_11 at 0 range 11 .. 11;
CALON at 0 range 12 .. 12;
CALSEL at 0 range 13 .. 13;
USERTRIM at 0 range 14 .. 14;
CALOUT at 0 range 15 .. 15;
Reserved_16_30 at 0 range 16 .. 30;
OPA_RANGE at 0 range 31 .. 31;
end record;
subtype OPAMP1_OTR_TRIMOFFSETN_Field is HAL.UInt5;
subtype OPAMP1_OTR_TRIMOFFSETP_Field is HAL.UInt5;
-- OPAMP1 offset trimming register in normal mode
type OPAMP1_OTR_Register is record
-- Trim for NMOS differential pairs
TRIMOFFSETN : OPAMP1_OTR_TRIMOFFSETN_Field := 16#0#;
-- unspecified
Reserved_5_7 : HAL.UInt3 := 16#0#;
-- Trim for PMOS differential pairs
TRIMOFFSETP : OPAMP1_OTR_TRIMOFFSETP_Field := 16#0#;
-- unspecified
Reserved_13_31 : HAL.UInt19 := 16#0#;
end record
with Volatile_Full_Access, Size => 32,
Bit_Order => System.Low_Order_First;
for OPAMP1_OTR_Register use record
TRIMOFFSETN at 0 range 0 .. 4;
Reserved_5_7 at 0 range 5 .. 7;
TRIMOFFSETP at 0 range 8 .. 12;
Reserved_13_31 at 0 range 13 .. 31;
end record;
subtype OPAMP1_LPOTR_TRIMLPOFFSETN_Field is HAL.UInt5;
subtype OPAMP1_LPOTR_TRIMLPOFFSETP_Field is HAL.UInt5;
-- OPAMP1 offset trimming register in low-power mode
type OPAMP1_LPOTR_Register is record
-- Trim for NMOS differential pairs
TRIMLPOFFSETN : OPAMP1_LPOTR_TRIMLPOFFSETN_Field := 16#0#;
-- unspecified
Reserved_5_7 : HAL.UInt3 := 16#0#;
-- Trim for PMOS differential pairs
TRIMLPOFFSETP : OPAMP1_LPOTR_TRIMLPOFFSETP_Field := 16#0#;
-- unspecified
Reserved_13_31 : HAL.UInt19 := 16#0#;
end record
with Volatile_Full_Access, Size => 32,
Bit_Order => System.Low_Order_First;
for OPAMP1_LPOTR_Register use record
TRIMLPOFFSETN at 0 range 0 .. 4;
Reserved_5_7 at 0 range 5 .. 7;
TRIMLPOFFSETP at 0 range 8 .. 12;
Reserved_13_31 at 0 range 13 .. 31;
end record;
subtype OPAMP2_CSR_OPAMODE_Field is HAL.UInt2;
subtype OPAMP2_CSR_PGA_GAIN_Field is HAL.UInt2;
subtype OPAMP2_CSR_VM_SEL_Field is HAL.UInt2;
-- OPAMP2 control/status register
type OPAMP2_CSR_Register is record
-- Operational amplifier Enable
OPAEN : Boolean := False;
-- Operational amplifier Low Power Mode
OPALPM : Boolean := False;
-- Operational amplifier PGA mode
OPAMODE : OPAMP2_CSR_OPAMODE_Field := 16#0#;
-- Operational amplifier Programmable amplifier gain value
PGA_GAIN : OPAMP2_CSR_PGA_GAIN_Field := 16#0#;
-- unspecified
Reserved_6_7 : HAL.UInt2 := 16#0#;
-- Inverting input selection
VM_SEL : OPAMP2_CSR_VM_SEL_Field := 16#0#;
-- Non inverted input selection
VP_SEL : Boolean := False;
-- unspecified
Reserved_11_11 : HAL.Bit := 16#0#;
-- Calibration mode enabled
CALON : Boolean := False;
-- Calibration selection
CALSEL : Boolean := False;
-- allows to switch from AOP offset trimmed values to AOP offset
USERTRIM : Boolean := False;
-- Operational amplifier calibration output
CALOUT : Boolean := False;
-- unspecified
Reserved_16_31 : HAL.UInt16 := 16#0#;
end record
with Volatile_Full_Access, Size => 32,
Bit_Order => System.Low_Order_First;
for OPAMP2_CSR_Register use record
OPAEN at 0 range 0 .. 0;
OPALPM at 0 range 1 .. 1;
OPAMODE at 0 range 2 .. 3;
PGA_GAIN at 0 range 4 .. 5;
Reserved_6_7 at 0 range 6 .. 7;
VM_SEL at 0 range 8 .. 9;
VP_SEL at 0 range 10 .. 10;
Reserved_11_11 at 0 range 11 .. 11;
CALON at 0 range 12 .. 12;
CALSEL at 0 range 13 .. 13;
USERTRIM at 0 range 14 .. 14;
CALOUT at 0 range 15 .. 15;
Reserved_16_31 at 0 range 16 .. 31;
end record;
subtype OPAMP2_OTR_TRIMOFFSETN_Field is HAL.UInt5;
subtype OPAMP2_OTR_TRIMOFFSETP_Field is HAL.UInt5;
-- OPAMP2 offset trimming register in normal mode
type OPAMP2_OTR_Register is record
-- Trim for NMOS differential pairs
TRIMOFFSETN : OPAMP2_OTR_TRIMOFFSETN_Field := 16#0#;
-- unspecified
Reserved_5_7 : HAL.UInt3 := 16#0#;
-- Trim for PMOS differential pairs
TRIMOFFSETP : OPAMP2_OTR_TRIMOFFSETP_Field := 16#0#;
-- unspecified
Reserved_13_31 : HAL.UInt19 := 16#0#;
end record
with Volatile_Full_Access, Size => 32,
Bit_Order => System.Low_Order_First;
for OPAMP2_OTR_Register use record
TRIMOFFSETN at 0 range 0 .. 4;
Reserved_5_7 at 0 range 5 .. 7;
TRIMOFFSETP at 0 range 8 .. 12;
Reserved_13_31 at 0 range 13 .. 31;
end record;
subtype OPAMP2_LPOTR_TRIMLPOFFSETN_Field is HAL.UInt5;
subtype OPAMP2_LPOTR_TRIMLPOFFSETP_Field is HAL.UInt5;
-- OPAMP2 offset trimming register in low-power mode
type OPAMP2_LPOTR_Register is record
-- Trim for NMOS differential pairs
TRIMLPOFFSETN : OPAMP2_LPOTR_TRIMLPOFFSETN_Field := 16#0#;
-- unspecified
Reserved_5_7 : HAL.UInt3 := 16#0#;
-- Trim for PMOS differential pairs
TRIMLPOFFSETP : OPAMP2_LPOTR_TRIMLPOFFSETP_Field := 16#0#;
-- unspecified
Reserved_13_31 : HAL.UInt19 := 16#0#;
end record
with Volatile_Full_Access, Size => 32,
Bit_Order => System.Low_Order_First;
for OPAMP2_LPOTR_Register use record
TRIMLPOFFSETN at 0 range 0 .. 4;
Reserved_5_7 at 0 range 5 .. 7;
TRIMLPOFFSETP at 0 range 8 .. 12;
Reserved_13_31 at 0 range 13 .. 31;
end record;
-----------------
-- Peripherals --
-----------------
-- Operational amplifiers
type OPAMP_Peripheral is record
-- OPAMP1 control/status register
OPAMP1_CSR : aliased OPAMP1_CSR_Register;
-- OPAMP1 offset trimming register in normal mode
OPAMP1_OTR : aliased OPAMP1_OTR_Register;
-- OPAMP1 offset trimming register in low-power mode
OPAMP1_LPOTR : aliased OPAMP1_LPOTR_Register;
-- OPAMP2 control/status register
OPAMP2_CSR : aliased OPAMP2_CSR_Register;
-- OPAMP2 offset trimming register in normal mode
OPAMP2_OTR : aliased OPAMP2_OTR_Register;
-- OPAMP2 offset trimming register in low-power mode
OPAMP2_LPOTR : aliased OPAMP2_LPOTR_Register;
end record
with Volatile;
for OPAMP_Peripheral use record
OPAMP1_CSR at 16#0# range 0 .. 31;
OPAMP1_OTR at 16#4# range 0 .. 31;
OPAMP1_LPOTR at 16#8# range 0 .. 31;
OPAMP2_CSR at 16#10# range 0 .. 31;
OPAMP2_OTR at 16#14# range 0 .. 31;
OPAMP2_LPOTR at 16#18# range 0 .. 31;
end record;
-- Operational amplifiers
OPAMP_Periph : aliased OPAMP_Peripheral
with Import, Address => System'To_Address (16#40007800#);
end STM32_SVD.OPAMP;
| 36.333333 | 71 | 0.627847 |
c7d4896210e8a8206048e2b84585ba5ddfd3f754 | 25,191 | adb | Ada | middleware/src/bitmap/soft_drawing_bitmap.adb | mbdme26/Ada_Drivers_Library | dc9cc80f5338c9d1ae942dd461eef6a2402e44de | [
"BSD-3-Clause"
] | 192 | 2016-06-01T18:32:04.000Z | 2022-03-26T22:52:31.000Z | middleware/src/bitmap/soft_drawing_bitmap.adb | mbdme26/Ada_Drivers_Library | dc9cc80f5338c9d1ae942dd461eef6a2402e44de | [
"BSD-3-Clause"
] | 239 | 2016-05-26T20:02:01.000Z | 2022-03-31T09:46:56.000Z | middleware/src/bitmap/soft_drawing_bitmap.adb | mbdme26/Ada_Drivers_Library | dc9cc80f5338c9d1ae942dd461eef6a2402e44de | [
"BSD-3-Clause"
] | 142 | 2016-06-05T08:12:20.000Z | 2022-03-24T17:37:17.000Z | ------------------------------------------------------------------------------
-- --
-- Copyright (C) 2015-2017, AdaCore --
-- --
-- Redistribution and use in source and binary forms, with or without --
-- modification, are permitted provided that the following conditions are --
-- met: --
-- 1. Redistributions of source code must retain the above copyright --
-- notice, this list of conditions and the following disclaimer. --
-- 2. Redistributions in binary form must reproduce the above copyright --
-- notice, this list of conditions and the following disclaimer in --
-- the documentation and/or other materials provided with the --
-- distribution. --
-- 3. Neither the name of the copyright holder nor the names of its --
-- contributors may be used to endorse or promote products derived --
-- from this software without specific prior written permission. --
-- --
-- THIS SOFTWARE IS PROVIDED BY THE COPYRIGHT HOLDERS AND CONTRIBUTORS --
-- "AS IS" AND ANY EXPRESS OR IMPLIED WARRANTIES, INCLUDING, BUT NOT --
-- LIMITED TO, THE IMPLIED WARRANTIES OF MERCHANTABILITY AND FITNESS FOR --
-- A PARTICULAR PURPOSE ARE DISCLAIMED. IN NO EVENT SHALL THE COPYRIGHT --
-- HOLDER OR CONTRIBUTORS BE LIABLE FOR ANY DIRECT, INDIRECT, INCIDENTAL, --
-- SPECIAL, EXEMPLARY, OR CONSEQUENTIAL DAMAGES (INCLUDING, BUT NOT --
-- LIMITED TO, PROCUREMENT OF SUBSTITUTE GOODS OR SERVICES; LOSS OF USE, --
-- DATA, OR PROFITS; OR BUSINESS INTERRUPTION) HOWEVER CAUSED AND ON ANY --
-- THEORY OF LIABILITY, WHETHER IN CONTRACT, STRICT LIABILITY, OR TORT --
-- (INCLUDING NEGLIGENCE OR OTHERWISE) ARISING IN ANY WAY OUT OF THE USE --
-- OF THIS SOFTWARE, EVEN IF ADVISED OF THE POSSIBILITY OF SUCH DAMAGE. --
-- --
------------------------------------------------------------------------------
with Bitmap_Color_Conversion; use Bitmap_Color_Conversion;
package body Soft_Drawing_Bitmap is
subtype Dispatch is Soft_Drawing_Bitmap_Buffer'Class;
----------------
-- Set_Source --
----------------
overriding
procedure Set_Source (Buffer : in out Soft_Drawing_Bitmap_Buffer;
ARGB : Bitmap_Color)
is
begin
Dispatch (Buffer).Set_Source
(Bitmap_Color_To_Word (Dispatch (Buffer).Color_Mode, ARGB));
end Set_Source;
------------
-- Source --
------------
overriding
function Source
(Buffer : Soft_Drawing_Bitmap_Buffer)
return Bitmap_Color
is
begin
return Word_To_Bitmap_Color (Dispatch (Buffer).Color_Mode,
Dispatch (Buffer).Source);
end Source;
---------------
-- Set_Pixel --
---------------
overriding
procedure Set_Pixel
(Buffer : in out Soft_Drawing_Bitmap_Buffer;
Pt : Point;
Color : Bitmap_Color)
is
begin
Dispatch (Buffer).Set_Source (Color);
Dispatch (Buffer).Set_Pixel (Pt);
end Set_Pixel;
---------------
-- Set_Pixel --
---------------
overriding
procedure Set_Pixel
(Buffer : in out Soft_Drawing_Bitmap_Buffer;
Pt : Point;
Native : UInt32)
is
begin
Dispatch (Buffer).Set_Source (Native);
Dispatch (Buffer).Set_Pixel (Pt);
end Set_Pixel;
overriding
function Pixel
(Buffer : Soft_Drawing_Bitmap_Buffer;
Pt : Point)
return Bitmap_Color
is (Word_To_Bitmap_Color (Dispatch (Buffer).Color_Mode,
Dispatch (Buffer).Pixel (Pt)));
---------------
-- Draw_Line --
---------------
overriding
procedure Draw_Line
(Buffer : in out Soft_Drawing_Bitmap_Buffer;
Start, Stop : Point;
Thickness : Natural := 1;
Fast : Boolean := True)
is
DX : constant Float := abs Float (Stop.X - Start.X);
DY : constant Float := abs Float (Stop.Y - Start.Y);
Err : Float;
X : Natural := Start.X;
Y : Natural := Start.Y;
Step_X : Integer := 1;
Step_Y : Integer := 1;
procedure Draw_Point (P : Point) with Inline;
----------------
-- Draw_Point --
----------------
procedure Draw_Point (P : Point) is
begin
if Thickness /= 1 then
if not Fast then
Dispatch (Buffer). Fill_Circle (Center => P,
Radius => Thickness / 2);
else
Dispatch (Buffer).Fill_Rect
(((P.X - (Thickness / 2), P.Y - (Thickness / 2)),
Thickness,
Thickness));
end if;
else
Dispatch (Buffer).Set_Pixel ((P.X, P.Y));
end if;
end Draw_Point;
begin
if Start.X > Stop.X then
Step_X := -1;
end if;
if Start.Y > Stop.Y then
Step_Y := -1;
end if;
if DX > DY then
Err := DX / 2.0;
while X /= Stop.X loop
Draw_Point ((X, Y));
Err := Err - DY;
if Err < 0.0 then
Y := Y + Step_Y;
Err := Err + DX;
end if;
X := X + Step_X;
end loop;
else
Err := DY / 2.0;
while Y /= Stop.Y loop
Draw_Point ((X, Y));
Err := Err - DX;
if Err < 0.0 then
X := X + Step_X;
Err := Err + DY;
end if;
Y := Y + Step_Y;
end loop;
end if;
Draw_Point ((X, Y));
end Draw_Line;
----------
-- Fill --
----------
overriding
procedure Fill
(Buffer : in out Soft_Drawing_Bitmap_Buffer)
is
begin
for Y in 0 .. Dispatch (Buffer).Height - 1 loop
for X in 0 .. Dispatch (Buffer).Width - 1 loop
Dispatch (Buffer).Set_Pixel ((X, Y));
end loop;
end loop;
end Fill;
---------------
-- Fill_Rect --
---------------
overriding
procedure Fill_Rect
(Buffer : in out Soft_Drawing_Bitmap_Buffer;
Area : Rect)
is
begin
for Y0 in Area.Position.Y .. Area.Position.Y + Area.Height - 1 loop
for X0 in Area.Position.X .. Area.Position.X + Area.Width - 1 loop
Dispatch (Buffer).Set_Pixel ((X0, Y0));
end loop;
end loop;
end Fill_Rect;
---------------
-- Copy_Rect --
---------------
overriding
procedure Copy_Rect
(Src_Buffer : Bitmap_Buffer'Class;
Src_Pt : Point;
Dst_Buffer : in out Soft_Drawing_Bitmap_Buffer;
Dst_Pt : Point;
Bg_Buffer : Bitmap_Buffer'Class;
Bg_Pt : Point;
Width : Natural;
Height : Natural;
Synchronous : Boolean)
is
begin
raise Constraint_Error with "Not implemented yet.";
end Copy_Rect;
---------------
-- Copy_Rect --
---------------
overriding
procedure Copy_Rect
(Src_Buffer : Bitmap_Buffer'Class;
Src_Pt : Point;
Dst_Buffer : in out Soft_Drawing_Bitmap_Buffer;
Dst_Pt : Point;
Width : Natural;
Height : Natural;
Synchronous : Boolean)
is
pragma Unreferenced (Synchronous);
Pix : Bitmap_Color;
begin
if Src_Pt.X + Width > Src_Buffer.Width
or else
Src_Pt.Y + Height > Src_Buffer.Height
then
raise Constraint_Error with "invalid copy area for source bitmap";
end if;
if Dst_Pt.X + Width > Dispatch (Dst_Buffer).Width
or else
Dst_Pt.Y + Height > Dispatch (Dst_Buffer).Height
then
raise Constraint_Error with "invalid copy area for destination bitmap";
end if;
for X in 0 .. Width - 1 loop
for Y in 0 .. Height - 1 loop
Pix := Src_Buffer.Pixel (Src_Pt + (X, Y));
Dispatch (Dst_Buffer).Set_Source (Pix);
Dispatch (Dst_Buffer).Set_Pixel (Dst_Pt + (X, Y));
end loop;
end loop;
end Copy_Rect;
---------------------
-- Copy_Rect_Blend --
---------------------
overriding
procedure Copy_Rect_Blend
(Src_Buffer : Soft_Drawing_Bitmap_Buffer;
Src_Pt : Point;
Dst_Buffer : in out Bitmap_Buffer'Class;
Dst_Pt : Point;
Width : Natural;
Height : Natural;
Synchronous : Boolean)
is
begin
Copy_Rect
(Src_Buffer => Dispatch (Src_Buffer),
Src_Pt => Src_Pt,
Dst_Buffer => Dst_Buffer,
Dst_Pt => Dst_Pt,
Bg_Buffer => Dst_Buffer,
Bg_Pt => Dst_Pt,
Width => Width,
Height => Height,
Synchronous => Synchronous);
end Copy_Rect_Blend;
------------------------
-- Draw_Vertical_Line --
------------------------
overriding
procedure Draw_Vertical_Line
(Buffer : in out Soft_Drawing_Bitmap_Buffer;
Pt : Point;
Height : Integer)
is
begin
Fill_Rect (Dispatch (Buffer),
(Position => Pt,
Width => 1,
Height => Height));
end Draw_Vertical_Line;
--------------------------
-- Draw_Horizontal_Line --
--------------------------
overriding
procedure Draw_Horizontal_Line
(Buffer : in out Soft_Drawing_Bitmap_Buffer;
Pt : Point;
Width : Integer)
is
begin
Fill_Rect (Dispatch (Buffer),
(Position => Pt,
Width => Width,
Height => 1));
end Draw_Horizontal_Line;
---------------
-- Draw_Rect --
---------------
overriding
procedure Draw_Rect
(Buffer : in out Soft_Drawing_Bitmap_Buffer;
Area : Rect;
Thickness : Natural := 1)
is
X0, Y0, X1, Y1 : Natural;
begin
X0 := Area.Position.X;
Y0 := Area.Position.Y;
X1 := Area.Position.X + Area.Width - 1;
Y1 := Area.Position.Y + Area.Height - 1;
Dispatch (Buffer).Fill_Rect
((Position => (X0 - Thickness / 2, Y0),
Width => Thickness,
Height => Area.Height + Thickness / 2));
Dispatch (Buffer).Fill_Rect
((Position => (X1 - Thickness / 2, Y0),
Width => Thickness,
Height => Area.Height + Thickness / 2));
Dispatch (Buffer).Fill_Rect
((Position => (X0, Y0 - Thickness / 2),
Width => Area.Width + Thickness / 2,
Height => Thickness));
Dispatch (Buffer).Fill_Rect
((Position => (X0, Y1 - Thickness / 2),
Width => Area. Width + Thickness / 2,
Height => Thickness));
end Draw_Rect;
-----------------------
-- Draw_Rounded_Rect --
-----------------------
overriding
procedure Draw_Rounded_Rect
(Buffer : in out Soft_Drawing_Bitmap_Buffer;
Area : Rect;
Radius : Natural;
Thickness : Natural := 1)
is
F : Integer := 1 - Radius;
ddF_X : Integer := 0;
ddF_Y : Integer := (-2) * Radius;
X0 : Integer := 0;
Y0 : Integer := Radius;
Center_Top : constant Natural := Area.Position.Y + Radius;
Center_Bot : constant Natural := Area.Position.Y + Area.Height - 1 - Radius;
Center_Lft : constant Natural := Area.Position.X + Radius;
Center_Rgt : constant Natural := Area.Position.X + Area.Width - 1 - Radius;
procedure Draw_Point (X, Y : Natural) with Inline;
----------------
-- Draw_Point --
----------------
procedure Draw_Point (X, Y : Natural) is
begin
if Thickness /= 1 then
Dispatch (Buffer).Fill_Rect
((Position => (X - (Thickness / 2), Y - (Thickness / 2)),
Width => Thickness,
Height => Thickness));
else
Dispatch (Buffer).Set_Pixel ((X, Y));
end if;
end Draw_Point;
begin
if Radius = 0 then
Draw_Rect (Buffer, Area, Thickness);
return;
end if;
Dispatch (Buffer).Fill_Rect
((Position => (Area.Position.X - Thickness / 2, Area.Position.Y + Radius),
Width => Thickness,
Height => Area.Height - 2 * Radius));
Dispatch (Buffer).Fill_Rect
((Position => (Area.Position.X + Area.Width - Thickness / 2 - 1, Area.Position.Y + Radius),
Width => Thickness,
Height => Area.Height - 2 * Radius));
Dispatch (Buffer).Fill_Rect
((Position => (Area.Position.X + Radius, Area.Position.Y - Thickness / 2),
Width => Area.Width - 2 * Radius,
Height => Thickness));
Dispatch (Buffer).Fill_Rect
((Position => (Area.Position.X + Radius, Area.Position.Y + Area.Height - Thickness / 2 - 1),
Width => Area.Width - 2 * Radius,
Height => Thickness));
while X0 < Y0 loop
if F >= 0 then
Y0 := Y0 - 1;
ddF_Y := ddF_Y + 2;
F := F + ddF_Y;
end if;
X0 := X0 + 1;
ddF_X := ddF_X + 2;
F := F + ddF_X + 1;
Draw_Point (Center_Rgt + X0, Center_Bot + Y0);
Draw_Point (Center_Lft - X0, Center_Bot + Y0);
Draw_Point (Center_Rgt + X0, Center_Top - Y0);
Draw_Point (Center_Lft - X0, Center_Top - Y0);
Draw_Point (Center_Rgt + Y0, Center_Bot + X0);
Draw_Point (Center_Lft - Y0, Center_Bot + X0);
Draw_Point (Center_Rgt + Y0, Center_Top - X0);
Draw_Point (Center_Lft - Y0, Center_Top - X0);
end loop;
end Draw_Rounded_Rect;
-----------------------
-- Fill_Rounded_Rect --
-----------------------
overriding
procedure Fill_Rounded_Rect
(Buffer : in out Soft_Drawing_Bitmap_Buffer;
Area : Rect;
Radius : Natural)
is
F : Integer := 1 - Radius;
ddF_X : Integer := 0;
ddF_Y : Integer := (-2) * Radius;
X0 : Integer := 0;
Y0 : Integer := Radius;
Center_Top : constant Natural := Area.Position.Y + Radius;
Center_Bot : constant Natural := Area.Position.Y + Area.Height - 1 - Radius;
Center_Lft : constant Natural := Area.Position.X + Radius;
begin
if Radius = 0 then
Dispatch (Buffer).Fill_Rect ((Position => (X0, Y0),
Width => Area.Width,
Height => Area.Height));
return;
end if;
Dispatch (Buffer).Fill_Rect
((Position => (Area.Position.X, Center_Top),
Width => Area.Width,
Height => Area.Height - 2 * Radius));
while X0 < Y0 loop
if F >= 0 then
Y0 := Y0 - 1;
ddF_Y := ddF_Y + 2;
F := F + ddF_Y;
end if;
X0 := X0 + 1;
ddF_X := ddF_X + 2;
F := F + ddF_X + 1;
Dispatch (Buffer).Draw_Horizontal_Line
((Center_Lft - X0, Center_Bot + Y0),
Area.Width - 2 * Radius + 2 * X0);
Dispatch (Buffer).Draw_Horizontal_Line
((Center_Lft - X0, Center_Top - Y0),
Area.Width - 2 * Radius + 2 * X0);
Dispatch (Buffer).Draw_Horizontal_Line
((Center_Lft - Y0, Center_Bot + X0),
Area.Width - 2 * Radius + 2 * Y0);
Dispatch (Buffer).Draw_Horizontal_Line
((Center_Lft - Y0, Center_Top - X0),
Area.Width - 2 * Radius + 2 * Y0);
end loop;
end Fill_Rounded_Rect;
-- http://rosettacode.org/wiki/Bitmap/Midpoint_circle_algorithm
-----------------
-- Draw_Circle --
-----------------
overriding
procedure Draw_Circle
(Buffer : in out Soft_Drawing_Bitmap_Buffer;
Center : Point;
Radius : Natural)
is
F : Integer := 1 - Radius;
ddF_X : Integer := 0;
ddF_Y : Integer := (-2) * Radius;
X : Integer := 0;
Y : Integer := Radius;
begin
Dispatch (Buffer).Set_Pixel ((Center.X, Center.Y + Radius));
Dispatch (Buffer).Set_Pixel ((Center.X, Center.Y - Radius));
Dispatch (Buffer).Set_Pixel ((Center.X + Radius, Center.Y));
Dispatch (Buffer).Set_Pixel ((Center.X - Radius, Center.Y));
while X < Y loop
if F >= 0 then
Y := Y - 1;
ddF_Y := ddF_Y + 2;
F := F + ddF_Y;
end if;
X := X + 1;
ddF_X := ddF_X + 2;
F := F + ddF_X + 1;
Dispatch (Buffer).Set_Pixel ((Center.X + X, Center.Y + Y));
Dispatch (Buffer).Set_Pixel ((Center.X - X, Center.Y + Y));
Dispatch (Buffer).Set_Pixel ((Center.X + X, Center.Y - Y));
Dispatch (Buffer).Set_Pixel ((Center.X - X, Center.Y - Y));
Dispatch (Buffer).Set_Pixel ((Center.X + Y, Center.Y + X));
Dispatch (Buffer).Set_Pixel ((Center.X - Y, Center.Y + X));
Dispatch (Buffer).Set_Pixel ((Center.X + Y, Center.Y - X));
Dispatch (Buffer).Set_Pixel ((Center.X - Y, Center.Y - X));
end loop;
end Draw_Circle;
-----------------
-- Fill_Circle --
-----------------
overriding
procedure Fill_Circle
(Buffer : in out Soft_Drawing_Bitmap_Buffer;
Center : Point;
Radius : Natural)
is
Buffer_Width : constant Natural := Dispatch (Buffer).Width;
Buffer_Height : constant Natural := Dispatch (Buffer).Height;
procedure Draw_Horizontal_Line (X, Y : Integer; Width : Natural);
------------------------
-- Draw_Vertical_Line --
------------------------
procedure Draw_Vertical_Line (X, Y : Integer; Height : Natural);
--------------------------
-- Draw_Horizontal_Line --
--------------------------
procedure Draw_Horizontal_Line (X, Y : Integer; Width : Natural)
is
X1, W1 : Natural;
begin
if Width = 0 then
return;
elsif Y < 0 or else Y >= Buffer_Height then
return;
elsif X + Width < 0 or else X >= Buffer_Width then
return;
end if;
if X < 0 then
X1 := 0;
W1 := Width + X;
else
X1 := X;
W1 := Width;
end if;
if X1 + W1 >= Buffer_Width then
W1 := Buffer_Width - X1 - 1;
end if;
if W1 = 0 then
return;
end if;
Dispatch (Buffer).Fill_Rect (((X1, Y), W1, 1));
end Draw_Horizontal_Line;
------------------------
-- Draw_Vertical_Line --
------------------------
procedure Draw_Vertical_Line (X, Y : Integer; Height : Natural)
is
Y1, H1 : Natural;
begin
if Height = 0 then
return;
elsif X < 0 or else X >= Buffer_Width then
return;
elsif Y + Height < 0 or else Y >= Buffer_Height then
return;
end if;
if Y < 0 then
Y1 := 0;
H1 := Height + Y;
else
Y1 := Y;
H1 := Height;
end if;
if Y1 + H1 >= Buffer_Height then
H1 := Buffer_Height - Y1 - 1;
end if;
if H1 = 0 then
return;
end if;
Dispatch (Buffer).Fill_Rect (((X, Y1), 1, H1));
end Draw_Vertical_Line;
F : Integer := 1 - Radius;
ddF_X : Integer := 1;
ddF_Y : Integer := -(2 * Radius);
X : Integer := 0;
Y : Integer := Radius;
begin
Draw_Vertical_Line
(Center.X,
Center.Y - Radius,
2 * Radius);
Draw_Horizontal_Line
(Center.X - Radius,
Center.Y,
2 * Radius);
while X < Y loop
if F >= 0 then
Y := Y - 1;
ddF_Y := ddF_Y + 2;
F := F + ddF_Y;
end if;
X := X + 1;
ddF_X := ddF_X + 2;
F := F + ddF_X;
Draw_Horizontal_Line (Center.X - X, Center.Y + Y, 2 * X);
Draw_Horizontal_Line (Center.X - X, Center.Y - Y, 2 * X);
Draw_Horizontal_Line (Center.X - Y, Center.Y + X, 2 * Y);
Draw_Horizontal_Line (Center.X - Y, Center.Y - X, 2 * Y);
end loop;
end Fill_Circle;
-------------------------
-- Cubic_Bezier_Points --
-------------------------
procedure Cubic_Bezier_Points
(P1, P2, P3, P4 : Point;
N : Positive;
Points : in out Point_Array)
is
begin
for I in Points'Range loop
declare
T : constant Float := Float (I) / Float (N);
A : constant Float := (1.0 - T)**3;
B : constant Float := 3.0 * T * (1.0 - T)**2;
C : constant Float := 3.0 * T**2 * (1.0 - T);
D : constant Float := T**3;
begin
Points (I).X := Natural (A * Float (P1.X) +
B * Float (P2.X) +
C * Float (P3.X) +
D * Float (P4.X));
Points (I).Y := Natural (A * Float (P1.Y) +
B * Float (P2.Y) +
C * Float (P3.Y) +
D * Float (P4.Y));
end;
end loop;
end Cubic_Bezier_Points;
---------------------------
-- Binomial_Coefficients --
---------------------------
procedure Binomial_Coefficients
(Outputs : in out Natural_Array)
is
N : constant Integer := Outputs'Length - 1;
F : constant Natural := Outputs'First;
L : constant Natural := Outputs'Last;
X : Natural;
begin
if N < 0 then
return;
end if;
Outputs (F) := 1;
Outputs (L) := 1;
for I in 0 .. (N / 2) - 1 loop
X := Outputs (F + I) * (N - I) / (I + 1);
Outputs (F + I + 1) := X;
Outputs (F + N - I - 1) := X;
end loop;
end Binomial_Coefficients;
-------------------
-- Bezier_Points --
-------------------
procedure Bezier_Points
(Input_Points : Point_Array;
N : Positive;
Points : in out Point_Array)
is
Degree : constant Integer := Input_Points'Last - Input_Points'First;
Binomial_Coeffs : Natural_Array (0 .. Degree);
Float_X, Float_Y, T, Total_Coeff : Float;
-----------
-- Power --
-----------
function Power (A : Float; B : Natural) return Float;
function Power (A : Float; B : Natural) return Float
is
Result : Float := 1.0;
Exp : Natural := B;
Base : Float := A;
begin
while Exp /= 0 loop
if Exp mod 2 = 1 then
Result := Result * Base;
end if;
Exp := Exp / 2;
exit when Exp = 0;
Base := Base * Base;
end loop;
return Result;
end Power;
begin
Binomial_Coefficients (Binomial_Coeffs);
for I in Points'Range loop
Float_X := 0.0;
Float_Y := 0.0;
T := Float (I) / Float (N);
for K in 0 .. Degree loop
Total_Coeff := (Float (Binomial_Coeffs (K)) * Power ((1.0 - T), (Degree - K)) * Power (T, K));
Float_X := Float_X + (Total_Coeff * Float (Input_Points (Input_Points'First + K).X));
Float_Y := Float_Y + (Total_Coeff * Float (Input_Points (Input_Points'First + K).Y));
end loop;
Points (I).X := Natural (Float_X);
Points (I).Y := Natural (Float_Y);
end loop;
end Bezier_Points;
------------------
-- Cubic_Bezier --
------------------
overriding
procedure Cubic_Bezier
(Buffer : in out Soft_Drawing_Bitmap_Buffer;
P1, P2, P3, P4 : Point;
N : Positive := 20;
Thickness : Natural := 1)
is
Points : Point_Array (0 .. N);
begin
Cubic_Bezier_Points (P1, P2, P3, P4, N, Points);
for I in Points'First .. Points'Last - 1 loop
Dispatch (Buffer).Draw_Line (Points (I), Points (I + 1),
Thickness => Thickness);
end loop;
end Cubic_Bezier;
------------
-- Bezier --
------------
overriding
procedure Bezier
(Buffer : in out Soft_Drawing_Bitmap_Buffer;
Input_Points : Point_Array;
N : Positive := 20;
Thickness : Natural := 1)
is
Points : Point_Array (0 .. N);
begin
Bezier_Points (Input_Points, N, Points);
for I in Points'First .. Points'Last - 1 loop
Dispatch (Buffer).Draw_Line (Points (I), Points (I + 1),
Thickness => Thickness);
end loop;
end Bezier;
end Soft_Drawing_Bitmap;
| 30.423913 | 106 | 0.489064 |
04491008644d01339efd92684f33af4f191adda9 | 55 | ads | Ada | specs/ada/common/tkmrpc-request-ike.ads | DrenfongWong/tkm-rpc | 075d22871cf81d497aac656c7f03a513278b641c | [
"BSD-3-Clause"
] | null | null | null | specs/ada/common/tkmrpc-request-ike.ads | DrenfongWong/tkm-rpc | 075d22871cf81d497aac656c7f03a513278b641c | [
"BSD-3-Clause"
] | null | null | null | specs/ada/common/tkmrpc-request-ike.ads | DrenfongWong/tkm-rpc | 075d22871cf81d497aac656c7f03a513278b641c | [
"BSD-3-Clause"
] | null | null | null | package Tkmrpc.Request.Ike is
end Tkmrpc.Request.Ike;
| 13.75 | 29 | 0.8 |
133fea2c3e88a86e6b0a4000afa9a705686b4582 | 979 | adb | Ada | gdb/testsuite/gdb.ada/array_subscript_addr/p.adb | greyblue9/binutils-gdb | 05377632b124fe7600eea7f4ee0e9a35d1b0cbdc | [
"BSD-3-Clause"
] | 1 | 2020-10-14T03:24:35.000Z | 2020-10-14T03:24:35.000Z | gdb/testsuite/gdb.ada/array_subscript_addr/p.adb | greyblue9/binutils-gdb | 05377632b124fe7600eea7f4ee0e9a35d1b0cbdc | [
"BSD-3-Clause"
] | null | null | null | gdb/testsuite/gdb.ada/array_subscript_addr/p.adb | greyblue9/binutils-gdb | 05377632b124fe7600eea7f4ee0e9a35d1b0cbdc | [
"BSD-3-Clause"
] | null | null | null | -- Copyright 2008-2021 Free Software Foundation, Inc.
--
-- This program is free software; you can redistribute it and/or modify
-- it under the terms of the GNU General Public License as published by
-- the Free Software Foundation; either version 3 of the License, or
-- (at your option) any later version.
--
-- This program is distributed in the hope that it will be useful,
-- but WITHOUT ANY WARRANTY; without even the implied warranty of
-- MERCHANTABILITY or FITNESS FOR A PARTICULAR PURPOSE. See the
-- GNU General Public License for more details.
--
-- You should have received a copy of the GNU General Public License
-- along with this program. If not, see <http://www.gnu.org/licenses/>.
procedure P is
type Table is array (1 .. 3) of Integer;
function Create (I : Integer) return Table is
begin
return (4 + I, 8 * I, 7 * I + 4);
end Create;
A : Table := Create (7);
C : Integer;
begin
C := A (1) + A (2); -- STOP
end P;
| 32.633333 | 73 | 0.682329 |
9ac7c70eab261c4c724a6ec9d4cbf30d5ef61f65 | 2,863 | ads | Ada | source/adam-compilation_unit.ads | charlie5/aIDE | fab406dbcd9b72a4cb215ffebb05166c788d6365 | [
"MIT"
] | 3 | 2017-04-29T14:25:22.000Z | 2017-09-29T10:15:28.000Z | source/adam-compilation_unit.ads | charlie5/aIDE | fab406dbcd9b72a4cb215ffebb05166c788d6365 | [
"MIT"
] | null | null | null | source/adam-compilation_unit.ads | charlie5/aIDE | fab406dbcd9b72a4cb215ffebb05166c788d6365 | [
"MIT"
] | null | null | null | with
AdaM.Any,
AdaM.Entity,
AdaM.Context,
AdaM.library_Item,
AdaM.Subunit,
Ada.Containers.Vectors,
Ada.Streams;
package AdaM.compilation_Unit
is
type Item is new AdaM.Any.item with private;
-- View
--
type View is access all Item'Class;
procedure View_write (Stream : not null access Ada.Streams.Root_Stream_Type'Class;
Self : in View);
procedure View_read (Stream : not null access Ada.Streams.Root_Stream_Type'Class;
Self : out View);
for View'write use View_write;
for View'read use View_read;
-- Vector
--
package Vectors is new ada.Containers.Vectors (Positive, View);
subtype Vector is Vectors.Vector;
-- Forge
--
function new_compilation_Unit (Name : in String := "") return compilation_Unit.view;
type unit_Kind is (library_unit_Kind, subunit_Kind);
function new_library_Unit (Name : in String := "";
the_Item : in library_Item.view) return compilation_Unit.view;
function new_Subunit (Name : in String := "";
the_Unit : in Subunit.view) return compilation_Unit.view;
procedure free (Self : in out compilation_Unit.view);
procedure destruct (Self : in out Item);
-- Attributes
--
overriding
function Id (Self : access Item) return AdaM.Id;
function Kind (Self : in Item) return unit_Kind;
function library_Item (Self : in Item) return AdaM.library_Item.view;
function Name (Self : in Item) return String;
procedure Name_is (Self : in out Item; Now : in String);
function Entity (Self : in Item) return AdaM.Entity.view;
procedure Entity_is (Self : in out Item; Now : in AdaM.Entity.view);
private
type library_Item_or_Subunit (Kind : unit_Kind := library_unit_Kind) is
record
case Kind
is
when library_unit_Kind =>
library_Item : AdaM.library_Item.view;
when subunit_Kind =>
Subunit : AdaM.Subunit.view;
end case;
end record;
type Item is new AdaM.Any.item with
record
Name : Text;
Context : AdaM.Context.view;
library_Item : library_Item_or_Subunit;
Entity : AdaM.Entity.view;
end record;
-- Streams
--
procedure Item_write (Stream : not null access Ada.Streams.Root_Stream_Type'Class;
Self : in Item);
procedure Item_read (Stream : not null access Ada.Streams.Root_Stream_Type'Class;
Self : out Item);
for Item'write use Item_write;
for Item'read use Item_read;
end AdaM.compilation_Unit;
| 27.009434 | 93 | 0.593433 |
38eccc095eae0575cc338dc005fd09752b337744 | 699 | ads | Ada | firmware/coreboot/3rdparty/libgfxinit/common/ironlake/hw-gfx-gma-power_and_clocks.ads | fabiojna02/OpenCellular | 45b6a202d6b2e2485c89955b9a6da920c4d56ddb | [
"CC-BY-4.0",
"BSD-3-Clause"
] | 1 | 2019-11-04T07:11:25.000Z | 2019-11-04T07:11:25.000Z | firmware/coreboot/3rdparty/libgfxinit/common/ironlake/hw-gfx-gma-power_and_clocks.ads | aimin-wang/OpenCellular | 5308146bf7edf43cc81c0e4d15305b711117070a | [
"CC-BY-4.0",
"BSD-3-Clause"
] | 13 | 2018-10-12T21:29:09.000Z | 2018-10-25T20:06:51.000Z | firmware/coreboot/3rdparty/libgfxinit/common/ironlake/hw-gfx-gma-power_and_clocks.ads | aimin-wang/OpenCellular | 5308146bf7edf43cc81c0e4d15305b711117070a | [
"CC-BY-4.0",
"BSD-3-Clause"
] | null | null | null | --
-- Copyright (C) 2016 secunet Security Networks AG
--
-- This program is free software; you can redistribute it and/or modify
-- it under the terms of the GNU General Public License as published by
-- the Free Software Foundation; either version 2 of the License, or
-- (at your option) any later version.
--
-- This program is distributed in the hope that it will be useful,
-- but WITHOUT ANY WARRANTY; without even the implied warranty of
-- MERCHANTABILITY or FITNESS FOR A PARTICULAR PURPOSE. See the
-- GNU General Public License for more details.
--
with HW.GFX.GMA.Power_And_Clocks_Ironlake;
private package HW.GFX.GMA.Power_And_Clocks
renames HW.GFX.GMA.Power_And_Clocks_Ironlake;
| 36.789474 | 71 | 0.76824 |
9aa4c18cf80569ee4a7ca1cc9ec39204f5604a0f | 95 | adb | Ada | tests/syntax_examples/src/basic_declaration-package_body_stub_name.adb | TNO/Dependency_Graph_Extractor-Ada | cfcc9132cf181e4db5139c14150f221efa69a6d6 | [
"BSD-3-Clause"
] | 1 | 2022-03-08T13:00:47.000Z | 2022-03-08T13:00:47.000Z | src/tools/Dependency_Graph_Extractor/tests/Syntax_Examples/src/basic_declaration-package_body_stub_name.adb | selroc/Renaissance-Ada | 39230b34aced4a9d83831be346ca103136c53715 | [
"BSD-3-Clause"
] | null | null | null | src/tools/Dependency_Graph_Extractor/tests/Syntax_Examples/src/basic_declaration-package_body_stub_name.adb | selroc/Renaissance-Ada | 39230b34aced4a9d83831be346ca103136c53715 | [
"BSD-3-Clause"
] | null | null | null | separate(Basic_Declaration)
package body Package_Body_Stub_Name is
end Package_Body_Stub_Name;
| 23.75 | 38 | 0.894737 |
ad2160aea86416e20f2b81db28b3044e76d31ae2 | 59,407 | adb | Ada | support/MinGW/lib/gcc/mingw32/9.2.0/adainclude/a-stzsup.adb | orb-zhuchen/Orb | 6da2404b949ac28bde786e08bf4debe4a27cd3a0 | [
"CNRI-Python-GPL-Compatible",
"MIT"
] | null | null | null | support/MinGW/lib/gcc/mingw32/9.2.0/adainclude/a-stzsup.adb | orb-zhuchen/Orb | 6da2404b949ac28bde786e08bf4debe4a27cd3a0 | [
"CNRI-Python-GPL-Compatible",
"MIT"
] | null | null | null | support/MinGW/lib/gcc/mingw32/9.2.0/adainclude/a-stzsup.adb | orb-zhuchen/Orb | 6da2404b949ac28bde786e08bf4debe4a27cd3a0 | [
"CNRI-Python-GPL-Compatible",
"MIT"
] | null | null | null | ------------------------------------------------------------------------------
-- --
-- GNAT RUN-TIME COMPONENTS --
-- --
-- A D A . S T R I N G S . W I D E _ W I D E _ S U P E R B O U N D E D --
-- --
-- B o d y --
-- --
-- Copyright (C) 2003-2019, Free Software Foundation, Inc. --
-- --
-- GNAT is free software; you can redistribute it and/or modify it under --
-- terms of the GNU General Public License as published by the Free Soft- --
-- ware Foundation; either version 3, or (at your option) any later ver- --
-- sion. GNAT is distributed in the hope that it will be useful, but WITH- --
-- OUT ANY WARRANTY; without even the implied warranty of MERCHANTABILITY --
-- or FITNESS FOR A PARTICULAR PURPOSE. --
-- --
-- As a special exception under Section 7 of GPL version 3, you are granted --
-- additional permissions described in the GCC Runtime Library Exception, --
-- version 3.1, as published by the Free Software Foundation. --
-- --
-- You should have received a copy of the GNU General Public License and --
-- a copy of the GCC Runtime Library Exception along with this program; --
-- see the files COPYING3 and COPYING.RUNTIME respectively. If not, see --
-- <http://www.gnu.org/licenses/>. --
-- --
-- GNAT was originally developed by the GNAT team at New York University. --
-- Extensive contributions were provided by Ada Core Technologies Inc. --
-- --
------------------------------------------------------------------------------
with Ada.Strings.Wide_Wide_Maps; use Ada.Strings.Wide_Wide_Maps;
with Ada.Strings.Wide_Wide_Search;
package body Ada.Strings.Wide_Wide_Superbounded is
------------
-- Concat --
------------
function Concat
(Left : Super_String;
Right : Super_String) return Super_String
is
begin
return Result : Super_String (Left.Max_Length) do
declare
Llen : constant Natural := Left.Current_Length;
Rlen : constant Natural := Right.Current_Length;
Nlen : constant Natural := Llen + Rlen;
begin
if Nlen > Left.Max_Length then
raise Ada.Strings.Length_Error;
else
Result.Current_Length := Nlen;
Result.Data (1 .. Llen) := Left.Data (1 .. Llen);
Result.Data (Llen + 1 .. Nlen) := Right.Data (1 .. Rlen);
end if;
end;
end return;
end Concat;
function Concat
(Left : Super_String;
Right : Wide_Wide_String) return Super_String
is
begin
return Result : Super_String (Left.Max_Length) do
declare
Llen : constant Natural := Left.Current_Length;
Nlen : constant Natural := Llen + Right'Length;
begin
if Nlen > Left.Max_Length then
raise Ada.Strings.Length_Error;
else
Result.Current_Length := Nlen;
Result.Data (1 .. Llen) := Left.Data (1 .. Llen);
Result.Data (Llen + 1 .. Nlen) := Right;
end if;
end;
end return;
end Concat;
function Concat
(Left : Wide_Wide_String;
Right : Super_String) return Super_String
is
begin
return Result : Super_String (Right.Max_Length) do
declare
Llen : constant Natural := Left'Length;
Rlen : constant Natural := Right.Current_Length;
Nlen : constant Natural := Llen + Rlen;
begin
if Nlen > Right.Max_Length then
raise Ada.Strings.Length_Error;
else
Result.Current_Length := Nlen;
Result.Data (1 .. Llen) := Left;
Result.Data (Llen + 1 .. Nlen) := Right.Data (1 .. Rlen);
end if;
end;
end return;
end Concat;
function Concat
(Left : Super_String;
Right : Wide_Wide_Character) return Super_String
is
begin
return Result : Super_String (Left.Max_Length) do
declare
Llen : constant Natural := Left.Current_Length;
begin
if Llen = Left.Max_Length then
raise Ada.Strings.Length_Error;
else
Result.Current_Length := Llen + 1;
Result.Data (1 .. Llen) := Left.Data (1 .. Llen);
Result.Data (Result.Current_Length) := Right;
end if;
end;
end return;
end Concat;
function Concat
(Left : Wide_Wide_Character;
Right : Super_String) return Super_String
is
begin
return Result : Super_String (Right.Max_Length) do
declare
Rlen : constant Natural := Right.Current_Length;
begin
if Rlen = Right.Max_Length then
raise Ada.Strings.Length_Error;
else
Result.Current_Length := Rlen + 1;
Result.Data (1) := Left;
Result.Data (2 .. Result.Current_Length) :=
Right.Data (1 .. Rlen);
end if;
end;
end return;
end Concat;
-----------
-- Equal --
-----------
function "="
(Left : Super_String;
Right : Super_String) return Boolean
is
begin
return Left.Current_Length = Right.Current_Length
and then Left.Data (1 .. Left.Current_Length) =
Right.Data (1 .. Right.Current_Length);
end "=";
function Equal
(Left : Super_String;
Right : Wide_Wide_String) return Boolean
is
begin
return Left.Current_Length = Right'Length
and then Left.Data (1 .. Left.Current_Length) = Right;
end Equal;
function Equal
(Left : Wide_Wide_String;
Right : Super_String) return Boolean
is
begin
return Left'Length = Right.Current_Length
and then Left = Right.Data (1 .. Right.Current_Length);
end Equal;
-------------
-- Greater --
-------------
function Greater
(Left : Super_String;
Right : Super_String) return Boolean
is
begin
return Left.Data (1 .. Left.Current_Length) >
Right.Data (1 .. Right.Current_Length);
end Greater;
function Greater
(Left : Super_String;
Right : Wide_Wide_String) return Boolean
is
begin
return Left.Data (1 .. Left.Current_Length) > Right;
end Greater;
function Greater
(Left : Wide_Wide_String;
Right : Super_String) return Boolean
is
begin
return Left > Right.Data (1 .. Right.Current_Length);
end Greater;
----------------------
-- Greater_Or_Equal --
----------------------
function Greater_Or_Equal
(Left : Super_String;
Right : Super_String) return Boolean
is
begin
return Left.Data (1 .. Left.Current_Length) >=
Right.Data (1 .. Right.Current_Length);
end Greater_Or_Equal;
function Greater_Or_Equal
(Left : Super_String;
Right : Wide_Wide_String) return Boolean
is
begin
return Left.Data (1 .. Left.Current_Length) >= Right;
end Greater_Or_Equal;
function Greater_Or_Equal
(Left : Wide_Wide_String;
Right : Super_String) return Boolean
is
begin
return Left >= Right.Data (1 .. Right.Current_Length);
end Greater_Or_Equal;
----------
-- Less --
----------
function Less
(Left : Super_String;
Right : Super_String) return Boolean
is
begin
return Left.Data (1 .. Left.Current_Length) <
Right.Data (1 .. Right.Current_Length);
end Less;
function Less
(Left : Super_String;
Right : Wide_Wide_String) return Boolean
is
begin
return Left.Data (1 .. Left.Current_Length) < Right;
end Less;
function Less
(Left : Wide_Wide_String;
Right : Super_String) return Boolean
is
begin
return Left < Right.Data (1 .. Right.Current_Length);
end Less;
-------------------
-- Less_Or_Equal --
-------------------
function Less_Or_Equal
(Left : Super_String;
Right : Super_String) return Boolean
is
begin
return Left.Data (1 .. Left.Current_Length) <=
Right.Data (1 .. Right.Current_Length);
end Less_Or_Equal;
function Less_Or_Equal
(Left : Super_String;
Right : Wide_Wide_String) return Boolean
is
begin
return Left.Data (1 .. Left.Current_Length) <= Right;
end Less_Or_Equal;
function Less_Or_Equal
(Left : Wide_Wide_String;
Right : Super_String) return Boolean
is
begin
return Left <= Right.Data (1 .. Right.Current_Length);
end Less_Or_Equal;
----------------------
-- Set_Super_String --
----------------------
procedure Set_Super_String
(Target : out Super_String;
Source : Wide_Wide_String;
Drop : Truncation := Error)
is
Slen : constant Natural := Source'Length;
Max_Length : constant Positive := Target.Max_Length;
begin
if Slen <= Max_Length then
Target.Current_Length := Slen;
Target.Data (1 .. Slen) := Source;
else
case Drop is
when Strings.Right =>
Target.Current_Length := Max_Length;
Target.Data (1 .. Max_Length) :=
Source (Source'First .. Source'First - 1 + Max_Length);
when Strings.Left =>
Target.Current_Length := Max_Length;
Target.Data (1 .. Max_Length) :=
Source (Source'Last - (Max_Length - 1) .. Source'Last);
when Strings.Error =>
raise Ada.Strings.Length_Error;
end case;
end if;
end Set_Super_String;
------------------
-- Super_Append --
------------------
-- Case of Super_String and Super_String
function Super_Append
(Left : Super_String;
Right : Super_String;
Drop : Strings.Truncation := Strings.Error) return Super_String
is
Max_Length : constant Positive := Left.Max_Length;
Result : Super_String (Max_Length);
Llen : constant Natural := Left.Current_Length;
Rlen : constant Natural := Right.Current_Length;
Nlen : constant Natural := Llen + Rlen;
begin
if Nlen <= Max_Length then
Result.Current_Length := Nlen;
Result.Data (1 .. Llen) := Left.Data (1 .. Llen);
Result.Data (Llen + 1 .. Nlen) := Right.Data (1 .. Rlen);
else
Result.Current_Length := Max_Length;
case Drop is
when Strings.Right =>
if Llen >= Max_Length then -- only case is Llen = Max_Length
Result.Data := Left.Data;
else
Result.Data (1 .. Llen) := Left.Data (1 .. Llen);
Result.Data (Llen + 1 .. Max_Length) :=
Right.Data (1 .. Max_Length - Llen);
end if;
when Strings.Left =>
if Rlen >= Max_Length then -- only case is Rlen = Max_Length
Result.Data := Right.Data;
else
Result.Data (1 .. Max_Length - Rlen) :=
Left.Data (Llen - (Max_Length - Rlen - 1) .. Llen);
Result.Data (Max_Length - Rlen + 1 .. Max_Length) :=
Right.Data (1 .. Rlen);
end if;
when Strings.Error =>
raise Ada.Strings.Length_Error;
end case;
end if;
return Result;
end Super_Append;
procedure Super_Append
(Source : in out Super_String;
New_Item : Super_String;
Drop : Truncation := Error)
is
Max_Length : constant Positive := Source.Max_Length;
Llen : constant Natural := Source.Current_Length;
Rlen : constant Natural := New_Item.Current_Length;
Nlen : constant Natural := Llen + Rlen;
begin
if Nlen <= Max_Length then
Source.Current_Length := Nlen;
Source.Data (Llen + 1 .. Nlen) := New_Item.Data (1 .. Rlen);
else
Source.Current_Length := Max_Length;
case Drop is
when Strings.Right =>
if Llen < Max_Length then
Source.Data (Llen + 1 .. Max_Length) :=
New_Item.Data (1 .. Max_Length - Llen);
end if;
when Strings.Left =>
if Rlen >= Max_Length then -- only case is Rlen = Max_Length
Source.Data := New_Item.Data;
else
Source.Data (1 .. Max_Length - Rlen) :=
Source.Data (Llen - (Max_Length - Rlen - 1) .. Llen);
Source.Data (Max_Length - Rlen + 1 .. Max_Length) :=
New_Item.Data (1 .. Rlen);
end if;
when Strings.Error =>
raise Ada.Strings.Length_Error;
end case;
end if;
end Super_Append;
-- Case of Super_String and Wide_Wide_String
function Super_Append
(Left : Super_String;
Right : Wide_Wide_String;
Drop : Strings.Truncation := Strings.Error) return Super_String
is
Max_Length : constant Positive := Left.Max_Length;
Result : Super_String (Max_Length);
Llen : constant Natural := Left.Current_Length;
Rlen : constant Natural := Right'Length;
Nlen : constant Natural := Llen + Rlen;
begin
if Nlen <= Max_Length then
Result.Current_Length := Nlen;
Result.Data (1 .. Llen) := Left.Data (1 .. Llen);
Result.Data (Llen + 1 .. Nlen) := Right;
else
Result.Current_Length := Max_Length;
case Drop is
when Strings.Right =>
if Llen >= Max_Length then -- only case is Llen = Max_Length
Result.Data := Left.Data;
else
Result.Data (1 .. Llen) := Left.Data (1 .. Llen);
Result.Data (Llen + 1 .. Max_Length) :=
Right (Right'First .. Right'First - 1 +
Max_Length - Llen);
end if;
when Strings.Left =>
if Rlen >= Max_Length then
Result.Data (1 .. Max_Length) :=
Right (Right'Last - (Max_Length - 1) .. Right'Last);
else
Result.Data (1 .. Max_Length - Rlen) :=
Left.Data (Llen - (Max_Length - Rlen - 1) .. Llen);
Result.Data (Max_Length - Rlen + 1 .. Max_Length) :=
Right;
end if;
when Strings.Error =>
raise Ada.Strings.Length_Error;
end case;
end if;
return Result;
end Super_Append;
procedure Super_Append
(Source : in out Super_String;
New_Item : Wide_Wide_String;
Drop : Truncation := Error)
is
Max_Length : constant Positive := Source.Max_Length;
Llen : constant Natural := Source.Current_Length;
Rlen : constant Natural := New_Item'Length;
Nlen : constant Natural := Llen + Rlen;
begin
if Nlen <= Max_Length then
Source.Current_Length := Nlen;
Source.Data (Llen + 1 .. Nlen) := New_Item;
else
Source.Current_Length := Max_Length;
case Drop is
when Strings.Right =>
if Llen < Max_Length then
Source.Data (Llen + 1 .. Max_Length) :=
New_Item (New_Item'First ..
New_Item'First - 1 + Max_Length - Llen);
end if;
when Strings.Left =>
if Rlen >= Max_Length then
Source.Data (1 .. Max_Length) :=
New_Item (New_Item'Last - (Max_Length - 1) ..
New_Item'Last);
else
Source.Data (1 .. Max_Length - Rlen) :=
Source.Data (Llen - (Max_Length - Rlen - 1) .. Llen);
Source.Data (Max_Length - Rlen + 1 .. Max_Length) :=
New_Item;
end if;
when Strings.Error =>
raise Ada.Strings.Length_Error;
end case;
end if;
end Super_Append;
-- Case of Wide_Wide_String and Super_String
function Super_Append
(Left : Wide_Wide_String;
Right : Super_String;
Drop : Strings.Truncation := Strings.Error) return Super_String
is
Max_Length : constant Positive := Right.Max_Length;
Result : Super_String (Max_Length);
Llen : constant Natural := Left'Length;
Rlen : constant Natural := Right.Current_Length;
Nlen : constant Natural := Llen + Rlen;
begin
if Nlen <= Max_Length then
Result.Current_Length := Nlen;
Result.Data (1 .. Llen) := Left;
Result.Data (Llen + 1 .. Llen + Rlen) := Right.Data (1 .. Rlen);
else
Result.Current_Length := Max_Length;
case Drop is
when Strings.Right =>
if Llen >= Max_Length then
Result.Data (1 .. Max_Length) :=
Left (Left'First .. Left'First + (Max_Length - 1));
else
Result.Data (1 .. Llen) := Left;
Result.Data (Llen + 1 .. Max_Length) :=
Right.Data (1 .. Max_Length - Llen);
end if;
when Strings.Left =>
if Rlen >= Max_Length then
Result.Data (1 .. Max_Length) :=
Right.Data (Rlen - (Max_Length - 1) .. Rlen);
else
Result.Data (1 .. Max_Length - Rlen) :=
Left (Left'Last - (Max_Length - Rlen - 1) .. Left'Last);
Result.Data (Max_Length - Rlen + 1 .. Max_Length) :=
Right.Data (1 .. Rlen);
end if;
when Strings.Error =>
raise Ada.Strings.Length_Error;
end case;
end if;
return Result;
end Super_Append;
-- Case of Super_String and Wide_Wide_Character
function Super_Append
(Left : Super_String;
Right : Wide_Wide_Character;
Drop : Strings.Truncation := Strings.Error) return Super_String
is
Max_Length : constant Positive := Left.Max_Length;
Result : Super_String (Max_Length);
Llen : constant Natural := Left.Current_Length;
begin
if Llen < Max_Length then
Result.Current_Length := Llen + 1;
Result.Data (1 .. Llen) := Left.Data (1 .. Llen);
Result.Data (Llen + 1) := Right;
return Result;
else
case Drop is
when Strings.Right =>
return Left;
when Strings.Left =>
Result.Current_Length := Max_Length;
Result.Data (1 .. Max_Length - 1) :=
Left.Data (2 .. Max_Length);
Result.Data (Max_Length) := Right;
return Result;
when Strings.Error =>
raise Ada.Strings.Length_Error;
end case;
end if;
end Super_Append;
procedure Super_Append
(Source : in out Super_String;
New_Item : Wide_Wide_Character;
Drop : Truncation := Error)
is
Max_Length : constant Positive := Source.Max_Length;
Llen : constant Natural := Source.Current_Length;
begin
if Llen < Max_Length then
Source.Current_Length := Llen + 1;
Source.Data (Llen + 1) := New_Item;
else
Source.Current_Length := Max_Length;
case Drop is
when Strings.Right =>
null;
when Strings.Left =>
Source.Data (1 .. Max_Length - 1) :=
Source.Data (2 .. Max_Length);
Source.Data (Max_Length) := New_Item;
when Strings.Error =>
raise Ada.Strings.Length_Error;
end case;
end if;
end Super_Append;
-- Case of Wide_Wide_Character and Super_String
function Super_Append
(Left : Wide_Wide_Character;
Right : Super_String;
Drop : Strings.Truncation := Strings.Error) return Super_String
is
Max_Length : constant Positive := Right.Max_Length;
Result : Super_String (Max_Length);
Rlen : constant Natural := Right.Current_Length;
begin
if Rlen < Max_Length then
Result.Current_Length := Rlen + 1;
Result.Data (1) := Left;
Result.Data (2 .. Rlen + 1) := Right.Data (1 .. Rlen);
return Result;
else
case Drop is
when Strings.Right =>
Result.Current_Length := Max_Length;
Result.Data (1) := Left;
Result.Data (2 .. Max_Length) :=
Right.Data (1 .. Max_Length - 1);
return Result;
when Strings.Left =>
return Right;
when Strings.Error =>
raise Ada.Strings.Length_Error;
end case;
end if;
end Super_Append;
-----------------
-- Super_Count --
-----------------
function Super_Count
(Source : Super_String;
Pattern : Wide_Wide_String;
Mapping : Wide_Wide_Maps.Wide_Wide_Character_Mapping :=
Wide_Wide_Maps.Identity) return Natural
is
begin
return
Wide_Wide_Search.Count
(Source.Data (1 .. Source.Current_Length), Pattern, Mapping);
end Super_Count;
function Super_Count
(Source : Super_String;
Pattern : Wide_Wide_String;
Mapping : Wide_Wide_Maps.Wide_Wide_Character_Mapping_Function)
return Natural
is
begin
return
Wide_Wide_Search.Count
(Source.Data (1 .. Source.Current_Length), Pattern, Mapping);
end Super_Count;
function Super_Count
(Source : Super_String;
Set : Wide_Wide_Maps.Wide_Wide_Character_Set) return Natural
is
begin
return Wide_Wide_Search.Count
(Source.Data (1 .. Source.Current_Length), Set);
end Super_Count;
------------------
-- Super_Delete --
------------------
function Super_Delete
(Source : Super_String;
From : Positive;
Through : Natural) return Super_String
is
Result : Super_String (Source.Max_Length);
Slen : constant Natural := Source.Current_Length;
Num_Delete : constant Integer := Through - From + 1;
begin
if Num_Delete <= 0 then
return Source;
elsif From > Slen + 1 then
raise Ada.Strings.Index_Error;
elsif Through >= Slen then
Result.Current_Length := From - 1;
Result.Data (1 .. From - 1) := Source.Data (1 .. From - 1);
return Result;
else
Result.Current_Length := Slen - Num_Delete;
Result.Data (1 .. From - 1) := Source.Data (1 .. From - 1);
Result.Data (From .. Result.Current_Length) :=
Source.Data (Through + 1 .. Slen);
return Result;
end if;
end Super_Delete;
procedure Super_Delete
(Source : in out Super_String;
From : Positive;
Through : Natural)
is
Slen : constant Natural := Source.Current_Length;
Num_Delete : constant Integer := Through - From + 1;
begin
if Num_Delete <= 0 then
return;
elsif From > Slen + 1 then
raise Ada.Strings.Index_Error;
elsif Through >= Slen then
Source.Current_Length := From - 1;
else
Source.Current_Length := Slen - Num_Delete;
Source.Data (From .. Source.Current_Length) :=
Source.Data (Through + 1 .. Slen);
end if;
end Super_Delete;
-------------------
-- Super_Element --
-------------------
function Super_Element
(Source : Super_String;
Index : Positive) return Wide_Wide_Character
is
begin
if Index <= Source.Current_Length then
return Source.Data (Index);
else
raise Strings.Index_Error;
end if;
end Super_Element;
----------------------
-- Super_Find_Token --
----------------------
procedure Super_Find_Token
(Source : Super_String;
Set : Wide_Wide_Maps.Wide_Wide_Character_Set;
From : Positive;
Test : Strings.Membership;
First : out Positive;
Last : out Natural)
is
begin
Wide_Wide_Search.Find_Token
(Source.Data (From .. Source.Current_Length), Set, Test, First, Last);
end Super_Find_Token;
procedure Super_Find_Token
(Source : Super_String;
Set : Wide_Wide_Maps.Wide_Wide_Character_Set;
Test : Strings.Membership;
First : out Positive;
Last : out Natural)
is
begin
Wide_Wide_Search.Find_Token
(Source.Data (1 .. Source.Current_Length), Set, Test, First, Last);
end Super_Find_Token;
----------------
-- Super_Head --
----------------
function Super_Head
(Source : Super_String;
Count : Natural;
Pad : Wide_Wide_Character := Wide_Wide_Space;
Drop : Strings.Truncation := Strings.Error) return Super_String
is
Max_Length : constant Positive := Source.Max_Length;
Result : Super_String (Max_Length);
Slen : constant Natural := Source.Current_Length;
Npad : constant Integer := Count - Slen;
begin
if Npad <= 0 then
Result.Current_Length := Count;
Result.Data (1 .. Count) := Source.Data (1 .. Count);
elsif Count <= Max_Length then
Result.Current_Length := Count;
Result.Data (1 .. Slen) := Source.Data (1 .. Slen);
Result.Data (Slen + 1 .. Count) := (others => Pad);
else
Result.Current_Length := Max_Length;
case Drop is
when Strings.Right =>
Result.Data (1 .. Slen) := Source.Data (1 .. Slen);
Result.Data (Slen + 1 .. Max_Length) := (others => Pad);
when Strings.Left =>
if Npad >= Max_Length then
Result.Data := (others => Pad);
else
Result.Data (1 .. Max_Length - Npad) :=
Source.Data (Count - Max_Length + 1 .. Slen);
Result.Data (Max_Length - Npad + 1 .. Max_Length) :=
(others => Pad);
end if;
when Strings.Error =>
raise Ada.Strings.Length_Error;
end case;
end if;
return Result;
end Super_Head;
procedure Super_Head
(Source : in out Super_String;
Count : Natural;
Pad : Wide_Wide_Character := Wide_Wide_Space;
Drop : Truncation := Error)
is
Max_Length : constant Positive := Source.Max_Length;
Slen : constant Natural := Source.Current_Length;
Npad : constant Integer := Count - Slen;
Temp : Wide_Wide_String (1 .. Max_Length);
begin
if Npad <= 0 then
Source.Current_Length := Count;
elsif Count <= Max_Length then
Source.Current_Length := Count;
Source.Data (Slen + 1 .. Count) := (others => Pad);
else
Source.Current_Length := Max_Length;
case Drop is
when Strings.Right =>
Source.Data (Slen + 1 .. Max_Length) := (others => Pad);
when Strings.Left =>
if Npad > Max_Length then
Source.Data := (others => Pad);
else
Temp := Source.Data;
Source.Data (1 .. Max_Length - Npad) :=
Temp (Count - Max_Length + 1 .. Slen);
for J in Max_Length - Npad + 1 .. Max_Length loop
Source.Data (J) := Pad;
end loop;
end if;
when Strings.Error =>
raise Ada.Strings.Length_Error;
end case;
end if;
end Super_Head;
-----------------
-- Super_Index --
-----------------
function Super_Index
(Source : Super_String;
Pattern : Wide_Wide_String;
Going : Strings.Direction := Strings.Forward;
Mapping : Wide_Wide_Maps.Wide_Wide_Character_Mapping :=
Wide_Wide_Maps.Identity) return Natural
is
begin
return Wide_Wide_Search.Index
(Source.Data (1 .. Source.Current_Length), Pattern, Going, Mapping);
end Super_Index;
function Super_Index
(Source : Super_String;
Pattern : Wide_Wide_String;
Going : Direction := Forward;
Mapping : Wide_Wide_Maps.Wide_Wide_Character_Mapping_Function)
return Natural
is
begin
return Wide_Wide_Search.Index
(Source.Data (1 .. Source.Current_Length), Pattern, Going, Mapping);
end Super_Index;
function Super_Index
(Source : Super_String;
Set : Wide_Wide_Maps.Wide_Wide_Character_Set;
Test : Strings.Membership := Strings.Inside;
Going : Strings.Direction := Strings.Forward) return Natural
is
begin
return Wide_Wide_Search.Index
(Source.Data (1 .. Source.Current_Length), Set, Test, Going);
end Super_Index;
function Super_Index
(Source : Super_String;
Pattern : Wide_Wide_String;
From : Positive;
Going : Direction := Forward;
Mapping : Wide_Wide_Maps.Wide_Wide_Character_Mapping :=
Wide_Wide_Maps.Identity) return Natural
is
begin
return Wide_Wide_Search.Index
(Source.Data (1 .. Source.Current_Length),
Pattern, From, Going, Mapping);
end Super_Index;
function Super_Index
(Source : Super_String;
Pattern : Wide_Wide_String;
From : Positive;
Going : Direction := Forward;
Mapping : Wide_Wide_Maps.Wide_Wide_Character_Mapping_Function)
return Natural
is
begin
return Wide_Wide_Search.Index
(Source.Data (1 .. Source.Current_Length),
Pattern, From, Going, Mapping);
end Super_Index;
function Super_Index
(Source : Super_String;
Set : Wide_Wide_Maps.Wide_Wide_Character_Set;
From : Positive;
Test : Membership := Inside;
Going : Direction := Forward) return Natural
is
begin
return Wide_Wide_Search.Index
(Source.Data (1 .. Source.Current_Length), Set, From, Test, Going);
end Super_Index;
---------------------------
-- Super_Index_Non_Blank --
---------------------------
function Super_Index_Non_Blank
(Source : Super_String;
Going : Strings.Direction := Strings.Forward) return Natural
is
begin
return
Wide_Wide_Search.Index_Non_Blank
(Source.Data (1 .. Source.Current_Length), Going);
end Super_Index_Non_Blank;
function Super_Index_Non_Blank
(Source : Super_String;
From : Positive;
Going : Direction := Forward) return Natural
is
begin
return
Wide_Wide_Search.Index_Non_Blank
(Source.Data (1 .. Source.Current_Length), From, Going);
end Super_Index_Non_Blank;
------------------
-- Super_Insert --
------------------
function Super_Insert
(Source : Super_String;
Before : Positive;
New_Item : Wide_Wide_String;
Drop : Strings.Truncation := Strings.Error) return Super_String
is
Max_Length : constant Positive := Source.Max_Length;
Result : Super_String (Max_Length);
Slen : constant Natural := Source.Current_Length;
Nlen : constant Natural := New_Item'Length;
Tlen : constant Natural := Slen + Nlen;
Blen : constant Natural := Before - 1;
Alen : constant Integer := Slen - Blen;
Droplen : constant Integer := Tlen - Max_Length;
-- Tlen is the length of the total string before possible truncation.
-- Blen, Alen are the lengths of the before and after pieces of the
-- source string.
begin
if Alen < 0 then
raise Ada.Strings.Index_Error;
elsif Droplen <= 0 then
Result.Current_Length := Tlen;
Result.Data (1 .. Blen) := Source.Data (1 .. Blen);
Result.Data (Before .. Before + Nlen - 1) := New_Item;
Result.Data (Before + Nlen .. Tlen) :=
Source.Data (Before .. Slen);
else
Result.Current_Length := Max_Length;
case Drop is
when Strings.Right =>
Result.Data (1 .. Blen) := Source.Data (1 .. Blen);
if Droplen > Alen then
Result.Data (Before .. Max_Length) :=
New_Item (New_Item'First
.. New_Item'First + Max_Length - Before);
else
Result.Data (Before .. Before + Nlen - 1) := New_Item;
Result.Data (Before + Nlen .. Max_Length) :=
Source.Data (Before .. Slen - Droplen);
end if;
when Strings.Left =>
Result.Data (Max_Length - (Alen - 1) .. Max_Length) :=
Source.Data (Before .. Slen);
if Droplen >= Blen then
Result.Data (1 .. Max_Length - Alen) :=
New_Item (New_Item'Last - (Max_Length - Alen) + 1
.. New_Item'Last);
else
Result.Data
(Blen - Droplen + 1 .. Max_Length - Alen) :=
New_Item;
Result.Data (1 .. Blen - Droplen) :=
Source.Data (Droplen + 1 .. Blen);
end if;
when Strings.Error =>
raise Ada.Strings.Length_Error;
end case;
end if;
return Result;
end Super_Insert;
procedure Super_Insert
(Source : in out Super_String;
Before : Positive;
New_Item : Wide_Wide_String;
Drop : Strings.Truncation := Strings.Error)
is
begin
-- We do a double copy here because this is one of the situations
-- in which we move data to the right, and at least at the moment,
-- GNAT is not handling such cases correctly ???
Source := Super_Insert (Source, Before, New_Item, Drop);
end Super_Insert;
------------------
-- Super_Length --
------------------
function Super_Length (Source : Super_String) return Natural is
begin
return Source.Current_Length;
end Super_Length;
---------------------
-- Super_Overwrite --
---------------------
function Super_Overwrite
(Source : Super_String;
Position : Positive;
New_Item : Wide_Wide_String;
Drop : Strings.Truncation := Strings.Error) return Super_String
is
Max_Length : constant Positive := Source.Max_Length;
Result : Super_String (Max_Length);
Endpos : constant Natural := Position + New_Item'Length - 1;
Slen : constant Natural := Source.Current_Length;
Droplen : Natural;
begin
if Position > Slen + 1 then
raise Ada.Strings.Index_Error;
elsif New_Item'Length = 0 then
return Source;
elsif Endpos <= Slen then
Result.Current_Length := Source.Current_Length;
Result.Data (1 .. Slen) := Source.Data (1 .. Slen);
Result.Data (Position .. Endpos) := New_Item;
return Result;
elsif Endpos <= Max_Length then
Result.Current_Length := Endpos;
Result.Data (1 .. Position - 1) := Source.Data (1 .. Position - 1);
Result.Data (Position .. Endpos) := New_Item;
return Result;
else
Result.Current_Length := Max_Length;
Droplen := Endpos - Max_Length;
case Drop is
when Strings.Right =>
Result.Data (1 .. Position - 1) :=
Source.Data (1 .. Position - 1);
Result.Data (Position .. Max_Length) :=
New_Item (New_Item'First .. New_Item'Last - Droplen);
return Result;
when Strings.Left =>
if New_Item'Length >= Max_Length then
Result.Data (1 .. Max_Length) :=
New_Item (New_Item'Last - Max_Length + 1 ..
New_Item'Last);
return Result;
else
Result.Data (1 .. Max_Length - New_Item'Length) :=
Source.Data (Droplen + 1 .. Position - 1);
Result.Data
(Max_Length - New_Item'Length + 1 .. Max_Length) :=
New_Item;
return Result;
end if;
when Strings.Error =>
raise Ada.Strings.Length_Error;
end case;
end if;
end Super_Overwrite;
procedure Super_Overwrite
(Source : in out Super_String;
Position : Positive;
New_Item : Wide_Wide_String;
Drop : Strings.Truncation := Strings.Error)
is
Max_Length : constant Positive := Source.Max_Length;
Endpos : constant Positive := Position + New_Item'Length - 1;
Slen : constant Natural := Source.Current_Length;
Droplen : Natural;
begin
if Position > Slen + 1 then
raise Ada.Strings.Index_Error;
elsif Endpos <= Slen then
Source.Data (Position .. Endpos) := New_Item;
elsif Endpos <= Max_Length then
Source.Data (Position .. Endpos) := New_Item;
Source.Current_Length := Endpos;
else
Source.Current_Length := Max_Length;
Droplen := Endpos - Max_Length;
case Drop is
when Strings.Right =>
Source.Data (Position .. Max_Length) :=
New_Item (New_Item'First .. New_Item'Last - Droplen);
when Strings.Left =>
if New_Item'Length > Max_Length then
Source.Data (1 .. Max_Length) :=
New_Item (New_Item'Last - Max_Length + 1 ..
New_Item'Last);
else
Source.Data (1 .. Max_Length - New_Item'Length) :=
Source.Data (Droplen + 1 .. Position - 1);
Source.Data
(Max_Length - New_Item'Length + 1 .. Max_Length) :=
New_Item;
end if;
when Strings.Error =>
raise Ada.Strings.Length_Error;
end case;
end if;
end Super_Overwrite;
---------------------------
-- Super_Replace_Element --
---------------------------
procedure Super_Replace_Element
(Source : in out Super_String;
Index : Positive;
By : Wide_Wide_Character)
is
begin
if Index <= Source.Current_Length then
Source.Data (Index) := By;
else
raise Ada.Strings.Index_Error;
end if;
end Super_Replace_Element;
-------------------------
-- Super_Replace_Slice --
-------------------------
function Super_Replace_Slice
(Source : Super_String;
Low : Positive;
High : Natural;
By : Wide_Wide_String;
Drop : Strings.Truncation := Strings.Error) return Super_String
is
Max_Length : constant Positive := Source.Max_Length;
Slen : constant Natural := Source.Current_Length;
begin
if Low > Slen + 1 then
raise Strings.Index_Error;
elsif High < Low then
return Super_Insert (Source, Low, By, Drop);
else
declare
Blen : constant Natural := Natural'Max (0, Low - 1);
Alen : constant Natural := Natural'Max (0, Slen - High);
Tlen : constant Natural := Blen + By'Length + Alen;
Droplen : constant Integer := Tlen - Max_Length;
Result : Super_String (Max_Length);
-- Tlen is the total length of the result string before any
-- truncation. Blen and Alen are the lengths of the pieces
-- of the original string that end up in the result string
-- before and after the replaced slice.
begin
if Droplen <= 0 then
Result.Current_Length := Tlen;
Result.Data (1 .. Blen) := Source.Data (1 .. Blen);
Result.Data (Low .. Low + By'Length - 1) := By;
Result.Data (Low + By'Length .. Tlen) :=
Source.Data (High + 1 .. Slen);
else
Result.Current_Length := Max_Length;
case Drop is
when Strings.Right =>
Result.Data (1 .. Blen) := Source.Data (1 .. Blen);
if Droplen > Alen then
Result.Data (Low .. Max_Length) :=
By (By'First .. By'First + Max_Length - Low);
else
Result.Data (Low .. Low + By'Length - 1) := By;
Result.Data (Low + By'Length .. Max_Length) :=
Source.Data (High + 1 .. Slen - Droplen);
end if;
when Strings.Left =>
Result.Data (Max_Length - (Alen - 1) .. Max_Length) :=
Source.Data (High + 1 .. Slen);
if Droplen >= Blen then
Result.Data (1 .. Max_Length - Alen) :=
By (By'Last - (Max_Length - Alen) + 1 .. By'Last);
else
Result.Data
(Blen - Droplen + 1 .. Max_Length - Alen) := By;
Result.Data (1 .. Blen - Droplen) :=
Source.Data (Droplen + 1 .. Blen);
end if;
when Strings.Error =>
raise Ada.Strings.Length_Error;
end case;
end if;
return Result;
end;
end if;
end Super_Replace_Slice;
procedure Super_Replace_Slice
(Source : in out Super_String;
Low : Positive;
High : Natural;
By : Wide_Wide_String;
Drop : Strings.Truncation := Strings.Error)
is
begin
-- We do a double copy here because this is one of the situations
-- in which we move data to the right, and at least at the moment,
-- GNAT is not handling such cases correctly ???
Source := Super_Replace_Slice (Source, Low, High, By, Drop);
end Super_Replace_Slice;
---------------------
-- Super_Replicate --
---------------------
function Super_Replicate
(Count : Natural;
Item : Wide_Wide_Character;
Drop : Truncation := Error;
Max_Length : Positive) return Super_String
is
Result : Super_String (Max_Length);
begin
if Count <= Max_Length then
Result.Current_Length := Count;
elsif Drop = Strings.Error then
raise Ada.Strings.Length_Error;
else
Result.Current_Length := Max_Length;
end if;
Result.Data (1 .. Result.Current_Length) := (others => Item);
return Result;
end Super_Replicate;
function Super_Replicate
(Count : Natural;
Item : Wide_Wide_String;
Drop : Truncation := Error;
Max_Length : Positive) return Super_String
is
Length : constant Integer := Count * Item'Length;
Result : Super_String (Max_Length);
Indx : Positive;
begin
if Length <= Max_Length then
Result.Current_Length := Length;
if Length > 0 then
Indx := 1;
for J in 1 .. Count loop
Result.Data (Indx .. Indx + Item'Length - 1) := Item;
Indx := Indx + Item'Length;
end loop;
end if;
else
Result.Current_Length := Max_Length;
case Drop is
when Strings.Right =>
Indx := 1;
while Indx + Item'Length <= Max_Length + 1 loop
Result.Data (Indx .. Indx + Item'Length - 1) := Item;
Indx := Indx + Item'Length;
end loop;
Result.Data (Indx .. Max_Length) :=
Item (Item'First .. Item'First + Max_Length - Indx);
when Strings.Left =>
Indx := Max_Length;
while Indx - Item'Length >= 1 loop
Result.Data (Indx - (Item'Length - 1) .. Indx) := Item;
Indx := Indx - Item'Length;
end loop;
Result.Data (1 .. Indx) :=
Item (Item'Last - Indx + 1 .. Item'Last);
when Strings.Error =>
raise Ada.Strings.Length_Error;
end case;
end if;
return Result;
end Super_Replicate;
function Super_Replicate
(Count : Natural;
Item : Super_String;
Drop : Strings.Truncation := Strings.Error) return Super_String
is
begin
return
Super_Replicate
(Count,
Item.Data (1 .. Item.Current_Length),
Drop,
Item.Max_Length);
end Super_Replicate;
-----------------
-- Super_Slice --
-----------------
function Super_Slice
(Source : Super_String;
Low : Positive;
High : Natural) return Wide_Wide_String
is
begin
-- Note: test of High > Length is in accordance with AI95-00128
return R : Wide_Wide_String (Low .. High) do
if Low > Source.Current_Length + 1
or else High > Source.Current_Length
then
raise Index_Error;
end if;
R := Source.Data (Low .. High);
end return;
end Super_Slice;
function Super_Slice
(Source : Super_String;
Low : Positive;
High : Natural) return Super_String
is
begin
return Result : Super_String (Source.Max_Length) do
if Low > Source.Current_Length + 1
or else High > Source.Current_Length
then
raise Index_Error;
else
Result.Current_Length := High - Low + 1;
Result.Data (1 .. Result.Current_Length) :=
Source.Data (Low .. High);
end if;
end return;
end Super_Slice;
procedure Super_Slice
(Source : Super_String;
Target : out Super_String;
Low : Positive;
High : Natural)
is
begin
if Low > Source.Current_Length + 1
or else High > Source.Current_Length
then
raise Index_Error;
else
Target.Current_Length := High - Low + 1;
Target.Data (1 .. Target.Current_Length) := Source.Data (Low .. High);
end if;
end Super_Slice;
----------------
-- Super_Tail --
----------------
function Super_Tail
(Source : Super_String;
Count : Natural;
Pad : Wide_Wide_Character := Wide_Wide_Space;
Drop : Strings.Truncation := Strings.Error) return Super_String
is
Max_Length : constant Positive := Source.Max_Length;
Result : Super_String (Max_Length);
Slen : constant Natural := Source.Current_Length;
Npad : constant Integer := Count - Slen;
begin
if Npad <= 0 then
Result.Current_Length := Count;
Result.Data (1 .. Count) :=
Source.Data (Slen - (Count - 1) .. Slen);
elsif Count <= Max_Length then
Result.Current_Length := Count;
Result.Data (1 .. Npad) := (others => Pad);
Result.Data (Npad + 1 .. Count) := Source.Data (1 .. Slen);
else
Result.Current_Length := Max_Length;
case Drop is
when Strings.Right =>
if Npad >= Max_Length then
Result.Data := (others => Pad);
else
Result.Data (1 .. Npad) := (others => Pad);
Result.Data (Npad + 1 .. Max_Length) :=
Source.Data (1 .. Max_Length - Npad);
end if;
when Strings.Left =>
Result.Data (1 .. Max_Length - Slen) := (others => Pad);
Result.Data (Max_Length - Slen + 1 .. Max_Length) :=
Source.Data (1 .. Slen);
when Strings.Error =>
raise Ada.Strings.Length_Error;
end case;
end if;
return Result;
end Super_Tail;
procedure Super_Tail
(Source : in out Super_String;
Count : Natural;
Pad : Wide_Wide_Character := Wide_Wide_Space;
Drop : Truncation := Error)
is
Max_Length : constant Positive := Source.Max_Length;
Slen : constant Natural := Source.Current_Length;
Npad : constant Integer := Count - Slen;
Temp : constant Wide_Wide_String (1 .. Max_Length) := Source.Data;
begin
if Npad <= 0 then
Source.Current_Length := Count;
Source.Data (1 .. Count) :=
Temp (Slen - (Count - 1) .. Slen);
elsif Count <= Max_Length then
Source.Current_Length := Count;
Source.Data (1 .. Npad) := (others => Pad);
Source.Data (Npad + 1 .. Count) := Temp (1 .. Slen);
else
Source.Current_Length := Max_Length;
case Drop is
when Strings.Right =>
if Npad >= Max_Length then
Source.Data := (others => Pad);
else
Source.Data (1 .. Npad) := (others => Pad);
Source.Data (Npad + 1 .. Max_Length) :=
Temp (1 .. Max_Length - Npad);
end if;
when Strings.Left =>
for J in 1 .. Max_Length - Slen loop
Source.Data (J) := Pad;
end loop;
Source.Data (Max_Length - Slen + 1 .. Max_Length) :=
Temp (1 .. Slen);
when Strings.Error =>
raise Ada.Strings.Length_Error;
end case;
end if;
end Super_Tail;
---------------------
-- Super_To_String --
---------------------
function Super_To_String
(Source : Super_String) return Wide_Wide_String
is
begin
return R : Wide_Wide_String (1 .. Source.Current_Length) do
R := Source.Data (1 .. Source.Current_Length);
end return;
end Super_To_String;
---------------------
-- Super_Translate --
---------------------
function Super_Translate
(Source : Super_String;
Mapping : Wide_Wide_Maps.Wide_Wide_Character_Mapping)
return Super_String
is
Result : Super_String (Source.Max_Length);
begin
Result.Current_Length := Source.Current_Length;
for J in 1 .. Source.Current_Length loop
Result.Data (J) := Value (Mapping, Source.Data (J));
end loop;
return Result;
end Super_Translate;
procedure Super_Translate
(Source : in out Super_String;
Mapping : Wide_Wide_Maps.Wide_Wide_Character_Mapping)
is
begin
for J in 1 .. Source.Current_Length loop
Source.Data (J) := Value (Mapping, Source.Data (J));
end loop;
end Super_Translate;
function Super_Translate
(Source : Super_String;
Mapping : Wide_Wide_Maps.Wide_Wide_Character_Mapping_Function)
return Super_String
is
Result : Super_String (Source.Max_Length);
begin
Result.Current_Length := Source.Current_Length;
for J in 1 .. Source.Current_Length loop
Result.Data (J) := Mapping.all (Source.Data (J));
end loop;
return Result;
end Super_Translate;
procedure Super_Translate
(Source : in out Super_String;
Mapping : Wide_Wide_Maps.Wide_Wide_Character_Mapping_Function)
is
begin
for J in 1 .. Source.Current_Length loop
Source.Data (J) := Mapping.all (Source.Data (J));
end loop;
end Super_Translate;
----------------
-- Super_Trim --
----------------
function Super_Trim
(Source : Super_String;
Side : Trim_End) return Super_String
is
Result : Super_String (Source.Max_Length);
Last : Natural := Source.Current_Length;
First : Positive := 1;
begin
if Side = Left or else Side = Both then
while First <= Last and then Source.Data (First) = ' ' loop
First := First + 1;
end loop;
end if;
if Side = Right or else Side = Both then
while Last >= First and then Source.Data (Last) = ' ' loop
Last := Last - 1;
end loop;
end if;
Result.Current_Length := Last - First + 1;
Result.Data (1 .. Result.Current_Length) := Source.Data (First .. Last);
return Result;
end Super_Trim;
procedure Super_Trim
(Source : in out Super_String;
Side : Trim_End)
is
Max_Length : constant Positive := Source.Max_Length;
Last : Natural := Source.Current_Length;
First : Positive := 1;
Temp : Wide_Wide_String (1 .. Max_Length);
begin
Temp (1 .. Last) := Source.Data (1 .. Last);
if Side = Left or else Side = Both then
while First <= Last and then Temp (First) = ' ' loop
First := First + 1;
end loop;
end if;
if Side = Right or else Side = Both then
while Last >= First and then Temp (Last) = ' ' loop
Last := Last - 1;
end loop;
end if;
Source.Data := (others => Wide_Wide_NUL);
Source.Current_Length := Last - First + 1;
Source.Data (1 .. Source.Current_Length) := Temp (First .. Last);
end Super_Trim;
function Super_Trim
(Source : Super_String;
Left : Wide_Wide_Maps.Wide_Wide_Character_Set;
Right : Wide_Wide_Maps.Wide_Wide_Character_Set) return Super_String
is
Result : Super_String (Source.Max_Length);
begin
for First in 1 .. Source.Current_Length loop
if not Is_In (Source.Data (First), Left) then
for Last in reverse First .. Source.Current_Length loop
if not Is_In (Source.Data (Last), Right) then
Result.Current_Length := Last - First + 1;
Result.Data (1 .. Result.Current_Length) :=
Source.Data (First .. Last);
return Result;
end if;
end loop;
end if;
end loop;
Result.Current_Length := 0;
return Result;
end Super_Trim;
procedure Super_Trim
(Source : in out Super_String;
Left : Wide_Wide_Maps.Wide_Wide_Character_Set;
Right : Wide_Wide_Maps.Wide_Wide_Character_Set)
is
begin
for First in 1 .. Source.Current_Length loop
if not Is_In (Source.Data (First), Left) then
for Last in reverse First .. Source.Current_Length loop
if not Is_In (Source.Data (Last), Right) then
if First = 1 then
Source.Current_Length := Last;
return;
else
Source.Current_Length := Last - First + 1;
Source.Data (1 .. Source.Current_Length) :=
Source.Data (First .. Last);
for J in Source.Current_Length + 1 ..
Source.Max_Length
loop
Source.Data (J) := Wide_Wide_NUL;
end loop;
return;
end if;
end if;
end loop;
Source.Current_Length := 0;
return;
end if;
end loop;
Source.Current_Length := 0;
end Super_Trim;
-----------
-- Times --
-----------
function Times
(Left : Natural;
Right : Wide_Wide_Character;
Max_Length : Positive) return Super_String
is
Result : Super_String (Max_Length);
begin
if Left > Max_Length then
raise Ada.Strings.Length_Error;
else
Result.Current_Length := Left;
for J in 1 .. Left loop
Result.Data (J) := Right;
end loop;
end if;
return Result;
end Times;
function Times
(Left : Natural;
Right : Wide_Wide_String;
Max_Length : Positive) return Super_String
is
Result : Super_String (Max_Length);
Pos : Positive := 1;
Rlen : constant Natural := Right'Length;
Nlen : constant Natural := Left * Rlen;
begin
if Nlen > Max_Length then
raise Ada.Strings.Index_Error;
else
Result.Current_Length := Nlen;
if Nlen > 0 then
for J in 1 .. Left loop
Result.Data (Pos .. Pos + Rlen - 1) := Right;
Pos := Pos + Rlen;
end loop;
end if;
end if;
return Result;
end Times;
function Times
(Left : Natural;
Right : Super_String) return Super_String
is
Result : Super_String (Right.Max_Length);
Pos : Positive := 1;
Rlen : constant Natural := Right.Current_Length;
Nlen : constant Natural := Left * Rlen;
begin
if Nlen > Right.Max_Length then
raise Ada.Strings.Length_Error;
else
Result.Current_Length := Nlen;
if Nlen > 0 then
for J in 1 .. Left loop
Result.Data (Pos .. Pos + Rlen - 1) :=
Right.Data (1 .. Rlen);
Pos := Pos + Rlen;
end loop;
end if;
end if;
return Result;
end Times;
---------------------
-- To_Super_String --
---------------------
function To_Super_String
(Source : Wide_Wide_String;
Max_Length : Natural;
Drop : Truncation := Error) return Super_String
is
Result : Super_String (Max_Length);
Slen : constant Natural := Source'Length;
begin
if Slen <= Max_Length then
Result.Current_Length := Slen;
Result.Data (1 .. Slen) := Source;
else
case Drop is
when Strings.Right =>
Result.Current_Length := Max_Length;
Result.Data (1 .. Max_Length) :=
Source (Source'First .. Source'First - 1 + Max_Length);
when Strings.Left =>
Result.Current_Length := Max_Length;
Result.Data (1 .. Max_Length) :=
Source (Source'Last - (Max_Length - 1) .. Source'Last);
when Strings.Error =>
raise Ada.Strings.Length_Error;
end case;
end if;
return Result;
end To_Super_String;
end Ada.Strings.Wide_Wide_Superbounded;
| 30.590628 | 79 | 0.5312 |
9ab4d8f02f8db031a4ecbeffea752e50f0c12545 | 217 | adb | Ada | tests/unset/main.adb | mosteo/ada-toml | d3454cdd51fa04098cdc76d2d30dd56f79a650e6 | [
"BSD-3-Clause"
] | 1 | 2020-03-30T20:12:29.000Z | 2020-03-30T20:12:29.000Z | tests/unset/main.adb | mosteo/ada-toml | d3454cdd51fa04098cdc76d2d30dd56f79a650e6 | [
"BSD-3-Clause"
] | null | null | null | tests/unset/main.adb | mosteo/ada-toml | d3454cdd51fa04098cdc76d2d30dd56f79a650e6 | [
"BSD-3-Clause"
] | null | null | null | with Ada.Text_IO;
with TOML;
procedure Main is
Value : constant TOML.TOML_Value := TOML.Load_File ("example.toml").Value;
begin
Value.Unset ("array");
Ada.Text_IO.Put_Line (Value.Dump_As_String);
end Main;
| 19.727273 | 77 | 0.723502 |
9a4a1e6d1acf0086a1a8de934f2f0bcdfa013433 | 4,959 | ads | Ada | bb-runtimes/runtimes/ravenscar-full-stm32f3x4/gnat/s-valuef.ads | JCGobbi/Nucleo-STM32F334R8 | 2a0b1b4b2664c92773703ac5e95dcb71979d051c | [
"BSD-3-Clause"
] | null | null | null | bb-runtimes/runtimes/ravenscar-full-stm32f3x4/gnat/s-valuef.ads | JCGobbi/Nucleo-STM32F334R8 | 2a0b1b4b2664c92773703ac5e95dcb71979d051c | [
"BSD-3-Clause"
] | null | null | null | bb-runtimes/runtimes/ravenscar-full-stm32f3x4/gnat/s-valuef.ads | JCGobbi/Nucleo-STM32F334R8 | 2a0b1b4b2664c92773703ac5e95dcb71979d051c | [
"BSD-3-Clause"
] | null | null | null | ------------------------------------------------------------------------------
-- --
-- GNAT COMPILER COMPONENTS --
-- --
-- S Y S T E M . V A L U E _ F --
-- --
-- S p e c --
-- --
-- Copyright (C) 2020-2021, Free Software Foundation, Inc. --
-- --
-- GNAT is free software; you can redistribute it and/or modify it under --
-- terms of the GNU General Public License as published by the Free Soft- --
-- ware Foundation; either version 3, or (at your option) any later ver- --
-- sion. GNAT is distributed in the hope that it will be useful, but WITH- --
-- OUT ANY WARRANTY; without even the implied warranty of MERCHANTABILITY --
-- or FITNESS FOR A PARTICULAR PURPOSE. --
-- --
-- --
-- --
-- --
-- --
-- You should have received a copy of the GNU General Public License and --
-- a copy of the GCC Runtime Library Exception along with this program; --
-- see the files COPYING3 and COPYING.RUNTIME respectively. If not, see --
-- <http://www.gnu.org/licenses/>. --
-- --
-- GNAT was originally developed by the GNAT team at New York University. --
-- Extensive contributions were provided by Ada Core Technologies Inc. --
-- --
------------------------------------------------------------------------------
-- This package contains the routines for supporting the Value attribute for
-- ordinary fixed point types whose Small is the ratio of two Int values, and
-- also for conversion operations required in Text_IO.Fixed_IO for such types.
generic
type Int is range <>;
type Uns is mod <>;
with procedure Scaled_Divide
(X, Y, Z : Int;
Q, R : out Int;
Round : Boolean);
package System.Value_F is
pragma Preelaborate;
function Scan_Fixed
(Str : String;
Ptr : not null access Integer;
Max : Integer;
Num : Int;
Den : Int) return Int;
-- This function scans the string starting at Str (Ptr.all) for a valid
-- real literal according to the syntax described in (RM 3.5(43)). The
-- substring scanned extends no further than Str (Max). There are three
-- cases for the return:
--
-- If a valid real literal is found after scanning past any initial spaces,
-- then Ptr.all is updated past the last character of the literal (but
-- trailing spaces are not scanned out). The value returned is the value
-- Int'Integer_Value (decimal-literal-value), using the given Num/Den to
-- determine this value.
--
-- If no valid real literal is found, then Ptr.all points either to an
-- initial non-digit character, or to Max + 1 if the field is all spaces
-- and the exception Constraint_Error is raised.
--
-- If a syntactically valid integer is scanned, but the value is out of
-- range, or, in the based case, the base value is out of range or there
-- is an out of range digit, then Ptr.all points past the integer, and
-- Constraint_Error is raised.
--
-- Note: these rules correspond to the requirements for leaving the
-- pointer positioned in Text_Io.Get
--
-- Note: if Str is null, i.e. if Max is less than Ptr, then this is a
-- special case of an all-blank string, and Ptr is unchanged, and hence
-- is greater than Max as required in this case.
function Value_Fixed
(Str : String;
Num : Int;
Den : Int) return Int;
-- Used in computing X'Value (Str) where X is an ordinary fixed-point type.
-- Str is the string argument of the attribute. Constraint_Error is raised
-- if the string is malformed or if the value is out of range of Int (not
-- the range of the fixed-point type, which must be done by the caller).
-- Otherwise the value returned is the value Int'Integer_Value
-- (decimal-literal-value), using Small Num/Den to determine this value.
end System.Value_F;
| 52.2 | 79 | 0.494656 |
9aa2ff2af590024397b761cc893d50f54367a39b | 2,608 | adb | Ada | src/ada/i686/lsc-internal-byteswap64.adb | Componolit/libsparkcrypto | 8531a07b6e9f5eb33eae0fa32759b4cbd3509d95 | [
"OpenSSL",
"Unlicense"
] | 30 | 2018-05-18T09:11:50.000Z | 2021-05-18T16:29:14.000Z | src/ada/i686/lsc-internal-byteswap64.adb | Componolit/libsparkcrypto | 8531a07b6e9f5eb33eae0fa32759b4cbd3509d95 | [
"OpenSSL",
"Unlicense"
] | 15 | 2018-12-13T07:53:36.000Z | 2019-09-24T19:43:35.000Z | src/ada/i686/lsc-internal-byteswap64.adb | Componolit/libsparkcrypto | 8531a07b6e9f5eb33eae0fa32759b4cbd3509d95 | [
"OpenSSL",
"Unlicense"
] | 3 | 2019-04-04T17:41:29.000Z | 2021-05-07T22:28:46.000Z | -------------------------------------------------------------------------------
-- This file is part of libsparkcrypto.
--
-- Copyright (C) 2010, Alexander Senier
-- Copyright (C) 2010, secunet Security Networks AG
-- All rights reserved.
--
-- Redistribution and use in source and binary forms, with or without
-- modification, are permitted provided that the following conditions are met:
--
-- * Redistributions of source code must retain the above copyright notice,
-- this list of conditions and the following disclaimer.
--
-- * Redistributions in binary form must reproduce the above copyright
-- notice, this list of conditions and the following disclaimer in the
-- documentation and/or other materials provided with the distribution.
--
-- * Neither the name of the nor the names of its contributors may be used
-- to endorse or promote products derived from this software without
-- specific prior written permission.
--
-- THIS SOFTWARE IS PROVIDED BY THE COPYRIGHT HOLDERS AND CONTRIBUTORS "AS IS"
-- AND ANY EXPRESS OR IMPLIED WARRANTIES, INCLUDING, BUT NOT LIMITED TO, THE
-- IMPLIED WARRANTIES OF MERCHANTABILITY AND FITNESS FOR A PARTICULAR PURPOSE
-- ARE DISCLAIMED. IN NO EVENT SHALL THE COPYRIGHT HOLDER OR CONTRIBUTORS
-- BE LIABLE FOR ANY DIRECT, INDIRECT, INCIDENTAL, SPECIAL, EXEMPLARY, OR
-- CONSEQUENTIAL DAMAGES (INCLUDING, BUT NOT LIMITED TO, PROCUREMENT OF
-- SUBSTITUTE GOODS OR SERVICES; LOSS OF USE, DATA, OR PROFITS; OR BUSINESS
-- INTERRUPTION) HOWEVER CAUSED AND ON ANY THEORY OF LIABILITY, WHETHER IN
-- CONTRACT, STRICT LIABILITY, OR TORT (INCLUDING NEGLIGENCE OR OTHERWISE)
-- ARISING IN ANY WAY OUT OF THE USE OF THIS SOFTWARE, EVEN IF ADVISED OF THE
-- POSSIBILITY OF SUCH DAMAGE.
-------------------------------------------------------------------------------
with Ada.Unchecked_Conversion;
with LSC.Internal.Byteswap32;
package body LSC.Internal.Byteswap64
with SPARK_Mode => Off
is
function Swap (Value : Types.Word64) return Types.Word64
is
type W32A is
record
MSB : Types.Word32;
LSB : Types.Word32;
end record;
function To_Word64 is new Ada.Unchecked_Conversion (W32A, Types.Word64);
function To_W32A is new Ada.Unchecked_Conversion (Types.Word64, W32A);
Temp : constant W32A := To_W32A (Value);
begin
return To_Word64 (W32A'(MSB => LSC.Internal.Byteswap32.Swap (Temp.LSB),
LSB => LSC.Internal.Byteswap32.Swap (Temp.MSB)));
end Swap;
end LSC.Internal.Byteswap64;
| 43.466667 | 79 | 0.667561 |
58698ff5cf01315258115f9657efb85ca956d3cd | 1,887 | adb | Ada | courses/fundamentals_of_ada/labs/solar_system/adv_240_tasking_embedded/answers/solar_system-graphics.adb | AdaCore/training_material | 6651eb2c53f8c39649b8e0b3c757bc8ff963025a | [
"CC-BY-4.0"
] | 15 | 2020-10-07T08:56:45.000Z | 2022-02-08T23:13:22.000Z | courses/fundamentals_of_ada/labs/solar_system/adv_240_tasking_embedded/answers/solar_system-graphics.adb | AdaCore/training_material | 6651eb2c53f8c39649b8e0b3c757bc8ff963025a | [
"CC-BY-4.0"
] | 20 | 2020-11-05T14:35:20.000Z | 2022-01-13T15:59:33.000Z | courses/fundamentals_of_ada/labs/solar_system/adv_240_tasking_embedded/answers/solar_system-graphics.adb | AdaCore/training_material | 6651eb2c53f8c39649b8e0b3c757bc8ff963025a | [
"CC-BY-4.0"
] | 6 | 2020-10-08T15:57:06.000Z | 2021-08-31T12:03:08.000Z | with Ada.Real_Time; use Ada.Real_Time;
package body Solar_System.Graphics is
procedure Draw_Body (Object : Body_Type; Canvas : Canvas_ID) is
begin
if Object.Visible then
Draw_Sphere
(Canvas => Canvas,
Position => (Object.Pos.X, Object.Pos.Y, 0.0),
Radius => Object.Radius,
Color => Object.Color);
if Object.With_Tail then
for I in T_Tail'Range loop
Draw_Sphere
(Canvas => Canvas,
Position => (Object.Tail (I).X, Object.Tail (I).Y, 0.0),
Radius => Object.Radius,
Color => Object.Color);
end loop;
end if;
end if;
end Draw_Body;
protected body Graphic_Context is
procedure Set_Window (W : Window_ID) is
begin
Window := W;
Canvas := Get_Canvas (W);
Is_Set := True;
end Set_Window;
entry Get_Window (W : out Window_ID; C : out Canvas_ID) when Is_Set is
begin
W := Window;
C := Canvas;
end Get_Window;
end Graphic_Context;
task body T_Display is
-- declare a variable Now of type Time to record current time
Now : Time;
-- declare a constant Period of 40 milliseconds of type Time_Span defining the loop period
Period : constant Time_Span := Milliseconds (30);
Canvas : Canvas_ID;
Window : Window_ID;
begin
Graphic_Context.Get_Window (Window, Canvas);
loop
Now := Clock;
for B of Bodies loop
Draw_Body (Object => B.Get_Data, Canvas => Canvas);
end loop;
Swap_Buffers (Window);
-- if Clock > Now + Period then
-- raise Program_Error;
-- end if;
delay until Now + Period;
end loop;
end T_Display;
end Solar_System.Graphics;
| 28.590909 | 97 | 0.558029 |
9a469d7d73affc4aa3baa076ff897e1ca5205df6 | 1,790 | adb | Ada | tests/src/test_utils-abstract_decoder-cobs_simple.adb | Fabien-Chouteau/COBS | 155ce5c2ecb4fffdac31df9dccd1a0d0c5916c2b | [
"MIT"
] | null | null | null | tests/src/test_utils-abstract_decoder-cobs_simple.adb | Fabien-Chouteau/COBS | 155ce5c2ecb4fffdac31df9dccd1a0d0c5916c2b | [
"MIT"
] | null | null | null | tests/src/test_utils-abstract_decoder-cobs_simple.adb | Fabien-Chouteau/COBS | 155ce5c2ecb4fffdac31df9dccd1a0d0c5916c2b | [
"MIT"
] | null | null | null | with COBS;
package body Test_Utils.Abstract_Decoder.COBS_Simple is
-------------
-- Receive --
-------------
overriding
procedure Receive (This : in out Instance; Data : Storage_Element)
is
begin
if Data /= 0 then
This.Input.Append (Data);
else
-- We reached the end of a frame so, decode and save the result
declare
Input : Storage_Array_Access := To_Array_Access (This.Input);
Output : Storage_Array
(1 .. COBS.Max_Encoding_Length (Input'Length));
Success : Boolean;
Last : Storage_Offset;
begin
if This.In_Place then
COBS.Decode_In_Place (Input.all, Last, Success);
else
COBS.Decode (Input.all, Output, Last, Success);
end if;
if not Success then
raise Program_Error;
end if;
if This.In_Place then
for Elt of Input (Input'First .. Last) loop
This.Push_To_Frame (Elt);
end loop;
else
for Elt of Output (Output'First .. Last) loop
This.Push_To_Frame (Elt);
end loop;
end if;
This.Save_Frame;
This.Start_New_Frame;
This.Input.Clear;
Free (Input);
end;
end if;
end Receive;
------------
-- Update --
------------
overriding
procedure Update (This : in out Instance) is
begin
null;
end Update;
-----------------
-- End_Of_Test --
-----------------
overriding
procedure End_Of_Test (This : in out Instance) is
begin
null;
end End_Of_Test;
end Test_Utils.Abstract_Decoder.COBS_Simple;
| 22.948718 | 74 | 0.508939 |
139ac686d56fa2053a1b5812b598326699fef499 | 2,242 | ads | Ada | src/counters/protected_counters.ads | jhumphry/auto_counters | bc7dfabf82febd09facf90371c8c11a628a06266 | [
"0BSD"
] | 5 | 2016-02-22T10:29:26.000Z | 2021-12-18T08:20:12.000Z | src/counters/protected_counters.ads | jhumphry/auto_counters | bc7dfabf82febd09facf90371c8c11a628a06266 | [
"0BSD"
] | 1 | 2022-02-16T03:38:08.000Z | 2022-02-20T21:11:30.000Z | src/counters/protected_counters.ads | jhumphry/auto_counters | bc7dfabf82febd09facf90371c8c11a628a06266 | [
"0BSD"
] | null | null | null | -- protected_counters.ads
-- Task safe counters for use with smart_ptrs
-- Copyright (c) 2016, James Humphry
--
-- Permission to use, copy, modify, and/or distribute this software for any
-- purpose with or without fee is hereby granted, provided that the above
-- copyright notice and this permission notice appear in all copies.
--
-- THE SOFTWARE IS PROVIDED "AS IS" AND THE AUTHOR DISCLAIMS ALL WARRANTIES WITH
-- REGARD TO THIS SOFTWARE INCLUDING ALL IMPLIED WARRANTIES OF MERCHANTABILITY
-- AND FITNESS. IN NO EVENT SHALL THE AUTHOR BE LIABLE FOR ANY SPECIAL, DIRECT,
-- INDIRECT, OR CONSEQUENTIAL DAMAGES OR ANY DAMAGES WHATSOEVER RESULTING FROM
-- LOSS OF USE, DATA OR PROFITS, WHETHER IN AN ACTION OF CONTRACT, NEGLIGENCE
-- OR OTHER TORTIOUS ACTION, ARISING OUT OF OR IN CONNECTION WITH THE USE OR
-- PERFORMANCE OF THIS SOFTWARE.
pragma Profile (No_Implementation_Extensions);
with Counters_Spec;
package Protected_Counters is
protected type Counter is
entry Lock;
procedure Unlock;
procedure Initialize_New_Counter;
function Use_Count return Natural;
entry Check_Increment_Use_Count;
entry Decrement_Use_Count;
function Weak_Ptr_Count return Natural;
entry Increment_Weak_Ptr_Count;
entry Decrement_Weak_Ptr_Count;
private
Locked : Boolean := True;
SP_Count : Natural := 1;
WP_Count : Natural := 0;
end Counter;
type Counter_Ptr is access Counter;
function Make_New_Counter return Counter_Ptr;
procedure Deallocate_If_Unused (C : in out Counter_Ptr) with Inline;
function Use_Count (C : in Counter) return Natural is
(C.Use_Count) with Inline;
procedure Check_Increment_Use_Count (C : in out Counter) with Inline;
procedure Decrement_Use_Count (C : in out Counter) with Inline;
function Weak_Ptr_Count (C : in Counter) return Natural is
(C.Weak_Ptr_Count) with Inline;
procedure Increment_Weak_Ptr_Count (C : in out Counter) with Inline;
procedure Decrement_Weak_Ptr_Count (C : in out Counter) with Inline;
package Protected_Counters_Spec is new Counters_Spec(Counter => Counter,
Counter_Ptr => Counter_Ptr);
end Protected_Counters;
| 33.969697 | 84 | 0.732382 |
9a61d0134020bd8ccc60d1cbec1b7c53b2244088 | 190 | ads | Ada | src/archive_searcher.ads | egilhh/Futures-in-Ada | f1c71ad6d7774e98dc44a98c9252bf0ead34a69e | [
"MIT"
] | 1 | 2015-11-25T19:57:53.000Z | 2015-11-25T19:57:53.000Z | src/archive_searcher.ads | egilhh/Futures-in-Ada | f1c71ad6d7774e98dc44a98c9252bf0ead34a69e | [
"MIT"
] | null | null | null | src/archive_searcher.ads | egilhh/Futures-in-Ada | f1c71ad6d7774e98dc44a98c9252bf0ead34a69e | [
"MIT"
] | null | null | null | package Archive_Searcher is
type Object is tagged null record;
function Search
(Self : in out Object;
Search_For : in String)
return String;
end Archive_Searcher;
| 15.833333 | 37 | 0.689474 |
4b515bba24adeb9e9e73b38179e5360ffd1e4a69 | 2,501 | adb | Ada | src/util/liste_generique.adb | SKNZ/BezierToSTL | 6cc9ed48aa1729140a0bb17aa7f67c17b51561ac | [
"MIT"
] | null | null | null | src/util/liste_generique.adb | SKNZ/BezierToSTL | 6cc9ed48aa1729140a0bb17aa7f67c17b51561ac | [
"MIT"
] | null | null | null | src/util/liste_generique.adb | SKNZ/BezierToSTL | 6cc9ed48aa1729140a0bb17aa7f67c17b51561ac | [
"MIT"
] | null | null | null | with Ada.Unchecked_Deallocation;
package body Liste_Generique is
procedure Liberer is new Ada.Unchecked_Deallocation(Cellule, Pointeur);
procedure Vider(L : in out Liste) is
Cour : Pointeur := L.Debut;
Next : Pointeur;
begin
while Cour /= null loop
Next := Cour.Suivant;
Liberer(Cour);
Cour := Next;
end loop;
-- La liste est réinitialisée
L.Taille := 0;
L.Debut := null;
L.Fin := null;
end;
procedure Insertion_Tete(L : in out Liste ; E : Element) is
begin
if L.Debut = null then
L.Debut := new Cellule'(Contenu => E, Suivant => null);
L.Fin := L.Debut;
else
L.Debut := new Cellule'(Contenu => E, Suivant => L.Debut);
end if;
L.Taille := L.Taille + 1;
end;
procedure Insertion_Queue(L : in out Liste ; E : Element) is
Ptr_Cellule : Pointeur;
begin
if L.Debut = null then
L.Debut := new Cellule'(Contenu => E, Suivant => null);
L.Fin := L.Debut;
else
Ptr_Cellule := new Cellule'(Contenu => E, Suivant => null);
L.Fin.Suivant := Ptr_Cellule;
L.Fin := Ptr_Cellule;
end if;
L.Taille := L.Taille + 1;
end;
procedure Parcourir (L : Liste) is
Cour : Pointeur := L.Debut;
begin
while Cour /= null loop
Traiter(Cour.Contenu);
Cour := Cour.Suivant;
end loop;
end;
procedure Parcourir_Par_Couples(L : Liste) is
Cour : Pointeur := L.Debut;
begin
while Cour /= null loop
if Cour.Suivant /= null then
Traiter(Cour.Contenu, Cour.Suivant.Contenu);
end if;
Cour := Cour.Suivant;
end loop;
end;
procedure Fusion(L1 : in out Liste ; L2 : in out Liste) is
begin
if L1.Taille /= 0 then
L1.Fin.Suivant := L2.Debut;
else
L1.Debut := L2.Debut;
end if;
L1.Fin := L2.Fin;
L1.Taille := L1.Taille + L2.Taille;
L2.Debut := null;
L2.Fin := null;
L2.Taille := 0;
end;
function Taille(L : Liste) return Natural is
begin
return L.Taille;
end;
function Tete(L : Liste) return Element is
begin
return L.Debut.Contenu;
end;
function Queue(L : Liste) return Element is
begin
return L.Fin.Contenu;
end;
end;
| 25.262626 | 75 | 0.527389 |
0432f75c48a31bd0573c6406e6f3594e5fa90213 | 11,908 | ads | Ada | ADL/drivers/stm32f334/stm32-gpio.ads | JCGobbi/Nucleo-STM32F334R8 | 2a0b1b4b2664c92773703ac5e95dcb71979d051c | [
"BSD-3-Clause"
] | 192 | 2016-06-01T18:32:04.000Z | 2022-03-26T22:52:31.000Z | ADL/drivers/stm32f334/stm32-gpio.ads | JCGobbi/Nucleo-STM32F334R8 | 2a0b1b4b2664c92773703ac5e95dcb71979d051c | [
"BSD-3-Clause"
] | 239 | 2016-05-26T20:02:01.000Z | 2022-03-31T09:46:56.000Z | ADL/drivers/stm32f334/stm32-gpio.ads | JCGobbi/Nucleo-STM32F334R8 | 2a0b1b4b2664c92773703ac5e95dcb71979d051c | [
"BSD-3-Clause"
] | 142 | 2016-06-05T08:12:20.000Z | 2022-03-24T17:37:17.000Z | ------------------------------------------------------------------------------
-- --
-- Copyright (C) 2015-2018, AdaCore --
-- --
-- Redistribution and use in source and binary forms, with or without --
-- modification, are permitted provided that the following conditions are --
-- met: --
-- 1. Redistributions of source code must retain the above copyright --
-- notice, this list of conditions and the following disclaimer. --
-- 2. Redistributions in binary form must reproduce the above copyright --
-- notice, this list of conditions and the following disclaimer in --
-- the documentation and/or other materials provided with the --
-- distribution. --
-- 3. Neither the name of STMicroelectronics nor the names of its --
-- contributors may be used to endorse or promote products derived --
-- from this software without specific prior written permission. --
-- --
-- THIS SOFTWARE IS PROVIDED BY THE COPYRIGHT HOLDERS AND CONTRIBUTORS --
-- "AS IS" AND ANY EXPRESS OR IMPLIED WARRANTIES, INCLUDING, BUT NOT --
-- LIMITED TO, THE IMPLIED WARRANTIES OF MERCHANTABILITY AND FITNESS FOR --
-- A PARTICULAR PURPOSE ARE DISCLAIMED. IN NO EVENT SHALL THE COPYRIGHT --
-- HOLDER OR CONTRIBUTORS BE LIABLE FOR ANY DIRECT, INDIRECT, INCIDENTAL, --
-- SPECIAL, EXEMPLARY, OR CONSEQUENTIAL DAMAGES (INCLUDING, BUT NOT --
-- LIMITED TO, PROCUREMENT OF SUBSTITUTE GOODS OR SERVICES; LOSS OF USE, --
-- DATA, OR PROFITS; OR BUSINESS INTERRUPTION) HOWEVER CAUSED AND ON ANY --
-- THEORY OF LIABILITY, WHETHER IN CONTRACT, STRICT LIABILITY, OR TORT --
-- (INCLUDING NEGLIGENCE OR OTHERWISE) ARISING IN ANY WAY OUT OF THE USE --
-- OF THIS SOFTWARE, EVEN IF ADVISED OF THE POSSIBILITY OF SUCH DAMAGE. --
-- --
-- --
-- This file is based on: --
-- --
-- @file stm32f4xx_hal_gpio.h --
-- @author MCD Application Team --
-- @version V1.1.0 --
-- @date 19-June-2014 --
-- @brief Header file of GPIO HAL module. --
-- --
-- COPYRIGHT(c) 2014 STMicroelectronics --
------------------------------------------------------------------------------
-- This file provides definitions for the GPIO ports on the STM32F4 (ARM
-- Cortex M4F) microcontrollers from ST Microelectronics.
private with STM32_SVD.GPIO;
with STM32.EXTI;
with HAL.GPIO;
package STM32.GPIO is
type GPIO_Port is limited private;
type GPIO_Pin is
(Pin_0, Pin_1, Pin_2, Pin_3, Pin_4, Pin_5, Pin_6, Pin_7,
Pin_8, Pin_9, Pin_10, Pin_11, Pin_12, Pin_13, Pin_14, Pin_15);
for GPIO_Pin use
(Pin_0 => 16#0001#,
Pin_1 => 16#0002#,
Pin_2 => 16#0004#,
Pin_3 => 16#0008#,
Pin_4 => 16#0010#,
Pin_5 => 16#0020#,
Pin_6 => 16#0040#,
Pin_7 => 16#0080#,
Pin_8 => 16#0100#,
Pin_9 => 16#0200#,
Pin_10 => 16#0400#,
Pin_11 => 16#0800#,
Pin_12 => 16#1000#,
Pin_13 => 16#2000#,
Pin_14 => 16#4000#,
Pin_15 => 16#8000#);
for GPIO_Pin'Size use 16;
-- for compatibility with hardware registers
type GPIO_Pins is array (Positive range <>) of GPIO_Pin;
-- Note that, in addition to aggregates, the language-defined catenation
-- operator "&" is available for types GPIO_Pin and GPIO_Pins, allowing one
-- to construct GPIO_Pins values conveniently
All_Pins : constant GPIO_Pins :=
(Pin_0, Pin_1, Pin_2, Pin_3, Pin_4, Pin_5, Pin_6, Pin_7,
Pin_8, Pin_9, Pin_10, Pin_11, Pin_12, Pin_13, Pin_14, Pin_15);
type Pin_IO_Modes is (Mode_In, Mode_Out, Mode_AF, Mode_Analog)
with Size => 2;
for Pin_IO_Modes use
(Mode_In => 0,
Mode_Out => 1,
Mode_AF => 2,
Mode_Analog => 3);
type Pin_Output_Types is (Push_Pull, Open_Drain)
with Size => 1;
for Pin_Output_Types use (Push_Pull => 0, Open_Drain => 1);
type Pin_Output_Speeds is (Speed_2MHz, Speed_25MHz, Speed_50MHz, Speed_100MHz)
with Size => 2;
for Pin_Output_Speeds use
(Speed_2MHz => 0, -- low
Speed_25MHz => 1, -- medium
Speed_50MHz => 2, -- high
Speed_100MHz => 3); -- very high
Speed_Low : Pin_Output_Speeds renames Speed_2MHz;
Speed_Medium : Pin_Output_Speeds renames Speed_25MHz;
Speed_High : Pin_Output_Speeds renames Speed_50MHz;
Speed_Very_High : Pin_Output_Speeds renames Speed_100MHz;
type Internal_Pin_Resistors is (Floating, Pull_Up, Pull_Down)
with Size => 2;
for Internal_Pin_Resistors use (Floating => 0,
Pull_Up => 1,
Pull_Down => 2);
-- see the Reference Manual, table 35, section 8.3
type GPIO_Port_Configuration (Mode : Pin_IO_Modes := Mode_In) is record
Resistors : Internal_Pin_Resistors;
case Mode is
when Mode_In | Mode_Analog =>
null;
when Mode_Out =>
Output_Type : Pin_Output_Types;
Speed : Pin_Output_Speeds;
when Mode_AF =>
AF_Output_Type : Pin_Output_Types;
AF_Speed : Pin_Output_Speeds;
AF : GPIO_Alternate_Function;
end case;
end record;
type GPIO_Point is new HAL.GPIO.GPIO_Point with record
Periph : access GPIO_Port;
-- Port should be a not null access, but this raises an exception
-- during elaboration.
Pin : GPIO_Pin;
end record;
overriding
function Support (This : GPIO_Point;
Capa : HAL.GPIO.Capability)
return Boolean
is (case Capa is
when others => True);
-- STM32 supports all GPIO capabilities
overriding
function Mode (This : GPIO_Point) return HAL.GPIO.GPIO_Mode;
overriding
procedure Set_Mode (This : in out GPIO_Point;
Mode : HAL.GPIO.GPIO_Config_Mode);
overriding
function Pull_Resistor (This : GPIO_Point)
return HAL.GPIO.GPIO_Pull_Resistor;
overriding
procedure Set_Pull_Resistor (This : in out GPIO_Point;
Pull : HAL.GPIO.GPIO_Pull_Resistor);
overriding
function Set (This : GPIO_Point) return Boolean with
Pre => Pin_IO_Mode (This) /= Mode_AF,
Inline;
-- Returns True if the bit specified by This.Pin is set (not zero) in the
-- input data register of This.Port.all; returns False otherwise.
overriding
procedure Set (This : in out GPIO_Point) with
Inline;
-- For This.Port.all, sets the output data register bit specified by
-- This.Pin to one. Other pins are unaffected.
overriding
procedure Clear (This : in out GPIO_Point) with
Inline;
-- For This.Port.all, sets the output data register bit specified by
-- This.Pin to zero. Other pins are unaffected.
overriding
procedure Toggle (This : in out GPIO_Point) with
Inline;
-- For This.Port.all, negates the output data register bit specified by
-- This.Pin (one becomes zero and vice versa). Other pins are unaffected.
procedure Drive (This : in out GPIO_Point; Condition : Boolean) with
Post => (This.Set = Condition),
Inline;
-- Drives This high or low (set or clear) based on the value of Condition
procedure Lock (This : GPIO_Point) with
Pre => not Locked (This),
Post => Locked (This);
-- For the given GPIO port, locks the current configuration of Pin until
-- the MCU is reset.
function Locked (This : GPIO_Point) return Boolean
with Inline;
procedure Configure_IO
(This : GPIO_Point;
Config : GPIO_Port_Configuration);
-- For Point.Pin on the Point.Port.all, configures the
-- characteristics specified by Config
function Pin_IO_Mode (This : GPIO_Point) return Pin_IO_Modes with Inline;
function Interrupt_Line_Number
(This : GPIO_Point) return EXTI.External_Line_Number;
-- Returns the external interrupt line number that corresponds to the
-- GPIO point.
procedure Configure_Trigger
(This : GPIO_Point;
Trigger : EXTI.External_Triggers);
-- For Point.Pin on Point.Port.all, connects the external line and enables
-- the external Trigger. Enables the SYSCFG clock.
procedure Configure_Alternate_Function
(This : GPIO_Point;
AF : GPIO_Alternate_Function);
-- For Point.Pin on Point.Port.all, sets the alternate function
-- specified by AF
type GPIO_Points is array (Positive range <>) of GPIO_Point;
function Any_Set (Pins : GPIO_Points) return Boolean with
Inline;
-- Returns True if any one of the bits specified by Pins is set (not zero)
-- in the Port input data register; returns False otherwise.
function Set (Pins : GPIO_Points) return Boolean
renames Any_Set;
-- Defined for readability when only one pin is specified in GPIO_Pins
function All_Set (Pins : GPIO_Points) return Boolean with
Inline;
-- Returns True iff all of the bits specified by Pins are set (not zero) in
-- the Port input data register; returns False otherwise.
procedure Set (Pins : in out GPIO_Points) with
Inline;
-- For the given GPIO port, sets all of the output data register bits
-- specified by Pins to one. Other pins are unaffected.
procedure Clear (Pins : in out GPIO_Points) with
Inline;
-- For the given GPIO port, sets of all of the output data register bits
-- specified by Pins to zero. Other pins are unaffected.
procedure Toggle (Points : in out GPIO_Points) with Inline;
-- For the given GPIO ports, negates all of the output data register bis
-- specified by Pins (ones become zeros and vice versa). Other pins are
-- unaffected.
procedure Lock (Points : GPIO_Points);
-- For the given GPIO port, locks the current configuration of Pin until
-- the MCU is reset.
procedure Configure_IO
(Points : GPIO_Points;
Config : GPIO_Port_Configuration);
-- For Point.Pin on the Point.Port.all, configures the
-- characteristics specified by Config
procedure Configure_Trigger
(Points : GPIO_Points;
Trigger : EXTI.External_Triggers);
-- For Point.Pin on Point.Port.all, configures the
-- characteristics specified by Trigger
procedure Configure_Alternate_Function
(Points : GPIO_Points;
AF : GPIO_Alternate_Function);
-- For Point.Pin on Point.Port.all, sets the alternate function
-- specified by AF
private
type GPIO_Port is new STM32_SVD.GPIO.GPIO_Peripheral;
LCCK : constant UInt32 := 16#0001_0000#;
-- As per the Reference Manual (RM0090; Doc ID 018909 Rev 6) pg 282,
-- this is the "Lock Key" used to control the locking of port/pin
-- configurations. It is bit 16 in the lock register (LCKR) of any
-- given port, thus the first bit of the upper 16 bits of the word.
end STM32.GPIO;
| 40.22973 | 82 | 0.596406 |
9a90cbc07c6fd78ee786054dc689cfe341a4f08a | 8,318 | ads | Ada | src/sqlite/ado-statements-sqlite.ads | Letractively/ada-ado | f0863c6975ae1a2c5349daee1e98a04fe11ba11e | [
"Apache-2.0"
] | null | null | null | src/sqlite/ado-statements-sqlite.ads | Letractively/ada-ado | f0863c6975ae1a2c5349daee1e98a04fe11ba11e | [
"Apache-2.0"
] | null | null | null | src/sqlite/ado-statements-sqlite.ads | Letractively/ada-ado | f0863c6975ae1a2c5349daee1e98a04fe11ba11e | [
"Apache-2.0"
] | null | null | null | -----------------------------------------------------------------------
-- ADO Mysql Database -- MySQL Database connections
-- Copyright (C) 2009, 2010, 2011, 2012, 2013 Stephane Carrez
-- Written by Stephane Carrez ([email protected])
--
-- Licensed under the Apache License, Version 2.0 (the "License");
-- you may not use this file except in compliance with the License.
-- You may obtain a copy of the License at
--
-- http://www.apache.org/licenses/LICENSE-2.0
--
-- Unless required by applicable law or agreed to in writing, software
-- distributed under the License is distributed on an "AS IS" BASIS,
-- WITHOUT WARRANTIES OR CONDITIONS OF ANY KIND, either express or implied.
-- See the License for the specific language governing permissions and
-- limitations under the License.
-----------------------------------------------------------------------
with System;
with ADO.Drivers.Connections.Sqlite;
package ADO.Statements.Sqlite is
type Handle is null record;
-- ------------------------------
-- Delete statement
-- ------------------------------
type Sqlite_Delete_Statement is new Delete_Statement with private;
type Sqlite_Delete_Statement_Access is access all Sqlite_Delete_Statement'Class;
-- Execute the query
overriding
procedure Execute (Stmt : in out Sqlite_Delete_Statement;
Result : out Natural);
-- Create the delete statement
function Create_Statement (Database : in ADO.Drivers.Connections.Sqlite.Sqlite_Access;
Table : in ADO.Schemas.Class_Mapping_Access)
return Delete_Statement_Access;
-- ------------------------------
-- Update statement
-- ------------------------------
type Sqlite_Update_Statement is new Update_Statement with private;
type Sqlite_Update_Statement_Access is access all Sqlite_Update_Statement'Class;
-- Execute the query
overriding
procedure Execute (Stmt : in out Sqlite_Update_Statement);
-- Execute the query
overriding
procedure Execute (Stmt : in out Sqlite_Update_Statement;
Result : out Integer);
-- Create an update statement
function Create_Statement (Database : in ADO.Drivers.Connections.Sqlite.Sqlite_Access;
Table : in ADO.Schemas.Class_Mapping_Access)
return Update_Statement_Access;
-- ------------------------------
-- Insert statement
-- ------------------------------
type Sqlite_Insert_Statement is new Insert_Statement with private;
type Sqlite_Insert_Statement_Access is access all Sqlite_Insert_Statement'Class;
-- Execute the query
overriding
procedure Execute (Stmt : in out Sqlite_Insert_Statement;
Result : out Integer);
-- Create an insert statement.
function Create_Statement (Database : in ADO.Drivers.Connections.Sqlite.Sqlite_Access;
Table : in ADO.Schemas.Class_Mapping_Access)
return Insert_Statement_Access;
-- ------------------------------
-- Query statement for SQLite
-- ------------------------------
type Sqlite_Query_Statement is new Query_Statement with private;
type Sqlite_Query_Statement_Access is access all Sqlite_Query_Statement'Class;
-- Execute the query
overriding
procedure Execute (Query : in out Sqlite_Query_Statement);
-- Get the number of rows returned by the query
overriding
function Get_Row_Count (Query : in Sqlite_Query_Statement) return Natural;
-- Returns True if there is more data (row) to fetch
overriding
function Has_Elements (Query : in Sqlite_Query_Statement) return Boolean;
-- Fetch the next row
overriding
procedure Next (Query : in out Sqlite_Query_Statement);
-- Returns true if the column <b>Column</b> is null.
overriding
function Is_Null (Query : in Sqlite_Query_Statement;
Column : in Natural) return Boolean;
-- Get the column value at position <b>Column</b> and
-- return it as an <b>Int64</b>.
-- Raises <b>Invalid_Type</b> if the value cannot be converted.
-- Raises <b>Invalid_Column</b> if the column does not exist.
overriding
function Get_Int64 (Query : Sqlite_Query_Statement;
Column : Natural) return Int64;
-- Get the column value at position <b>Column</b> and
-- return it as an <b>Unbounded_String</b>.
-- Raises <b>Invalid_Type</b> if the value cannot be converted.
-- Raises <b>Invalid_Column</b> if the column does not exist.
overriding
function Get_Unbounded_String (Query : Sqlite_Query_Statement;
Column : Natural) return Unbounded_String;
-- Get the column value at position <b>Column</b> and
-- return it as an <b>Unbounded_String</b>.
-- Raises <b>Invalid_Type</b> if the value cannot be converted.
-- Raises <b>Invalid_Column</b> if the column does not exist.
overriding
function Get_String (Query : Sqlite_Query_Statement;
Column : Natural) return String;
-- Get the column value at position <b>Column</b> and
-- return it as a <b>Blob</b> reference.
overriding
function Get_Blob (Query : in Sqlite_Query_Statement;
Column : in Natural) return ADO.Blob_Ref;
-- Get the column value at position <b>Column</b> and
-- return it as an <b>Time</b>.
-- Raises <b>Invalid_Type</b> if the value cannot be converted.
-- Raises <b>Invalid_Column</b> if the column does not exist.
function Get_Time (Query : Sqlite_Query_Statement;
Column : Natural) return Ada.Calendar.Time;
-- Get the column type
-- Raises <b>Invalid_Column</b> if the column does not exist.
overriding
function Get_Column_Type (Query : Sqlite_Query_Statement;
Column : Natural)
return ADO.Schemas.Column_Type;
-- Get the column name.
-- Raises <b>Invalid_Column</b> if the column does not exist.
overriding
function Get_Column_Name (Query : in Sqlite_Query_Statement;
Column : in Natural)
return String;
-- Get the number of columns in the result.
overriding
function Get_Column_Count (Query : in Sqlite_Query_Statement)
return Natural;
-- Deletes the query statement.
overriding
procedure Finalize (Query : in out Sqlite_Query_Statement);
-- Create the query statement.
function Create_Statement (Database : in ADO.Drivers.Connections.Sqlite.Sqlite_Access;
Table : in ADO.Schemas.Class_Mapping_Access)
return Query_Statement_Access;
-- Create the query statement.
function Create_Statement (Database : in ADO.Drivers.Connections.Sqlite.Sqlite_Access;
Query : in String)
return Query_Statement_Access;
private
type State is (HAS_ROW, HAS_MORE, DONE, ERROR);
type Sqlite_Query_Statement is new Query_Statement with record
This_Query : aliased ADO.SQL.Query;
Connection : ADO.Drivers.Connections.Sqlite.Sqlite_Access;
Stmt : ADO.Drivers.Connections.Sqlite.Sqlite_Access := System.Null_Address;
Counter : Natural := 1;
Status : State := DONE;
Max_Column : Natural;
end record;
type Sqlite_Delete_Statement is new Delete_Statement with record
Connection : ADO.Drivers.Connections.Sqlite.Sqlite_Access;
Table : ADO.Schemas.Class_Mapping_Access;
Delete_Query : aliased ADO.SQL.Query;
end record;
type Sqlite_Update_Statement is new Update_Statement with record
Connection : ADO.Drivers.Connections.Sqlite.Sqlite_Access;
This_Query : aliased ADO.SQL.Update_Query;
Table : ADO.Schemas.Class_Mapping_Access;
end record;
type Sqlite_Insert_Statement is new Insert_Statement with record
Connection : ADO.Drivers.Connections.Sqlite.Sqlite_Access;
This_Query : aliased ADO.SQL.Update_Query;
Table : ADO.Schemas.Class_Mapping_Access;
end record;
end ADO.Statements.Sqlite;
| 40.57561 | 89 | 0.638976 |
04472b517484ac8a8d1bbe661931cc63983471fe | 1,258 | ads | Ada | regtests/util-http-cookies-tests.ads | yrashk/ada-util | 2aaa1d87e92a7137e1c63dce90f0722c549dfafd | [
"Apache-2.0"
] | 60 | 2015-01-18T23:05:34.000Z | 2022-03-20T18:56:30.000Z | regtests/util-http-cookies-tests.ads | yrashk/ada-util | 2aaa1d87e92a7137e1c63dce90f0722c549dfafd | [
"Apache-2.0"
] | 20 | 2016-09-15T16:41:30.000Z | 2022-03-29T22:02:32.000Z | regtests/util-http-cookies-tests.ads | yrashk/ada-util | 2aaa1d87e92a7137e1c63dce90f0722c549dfafd | [
"Apache-2.0"
] | 10 | 2015-02-13T04:00:45.000Z | 2022-03-20T18:57:54.000Z | -----------------------------------------------------------------------
-- util-http-cookies-tests - Unit tests for Cookies
-- Copyright (C) 2011 Stephane Carrez
-- Written by Stephane Carrez ([email protected])
--
-- Licensed under the Apache License, Version 2.0 (the "License");
-- you may not use this file except in compliance with the License.
-- You may obtain a copy of the License at
--
-- http://www.apache.org/licenses/LICENSE-2.0
--
-- Unless required by applicable law or agreed to in writing, software
-- distributed under the License is distributed on an "AS IS" BASIS,
-- WITHOUT WARRANTIES OR CONDITIONS OF ANY KIND, either express or implied.
-- See the License for the specific language governing permissions and
-- limitations under the License.
-----------------------------------------------------------------------
with Util.Tests;
package Util.Http.Cookies.Tests is
procedure Add_Tests (Suite : in Util.Tests.Access_Test_Suite);
type Test is new Util.Tests.Test with null record;
-- Test creation of cookie
procedure Test_Create_Cookie (T : in out Test);
procedure Test_To_Http_Header (T : in out Test);
procedure Test_Parse_Http_Header (T : in out Test);
end Util.Http.Cookies.Tests;
| 38.121212 | 76 | 0.651828 |
9aa937852b46f67e2de34b029f3ca14686ac8156 | 4,996 | ada | Ada | gcc-gcc-7_3_0-release/gcc/testsuite/ada/acats/tests/c4/c41404a.ada | best08618/asylo | 5a520a9f5c461ede0f32acc284017b737a43898c | [
"Apache-2.0"
] | 7 | 2020-05-02T17:34:05.000Z | 2021-10-17T10:15:18.000Z | gcc-gcc-7_3_0-release/gcc/testsuite/ada/acats/tests/c4/c41404a.ada | best08618/asylo | 5a520a9f5c461ede0f32acc284017b737a43898c | [
"Apache-2.0"
] | null | null | null | gcc-gcc-7_3_0-release/gcc/testsuite/ada/acats/tests/c4/c41404a.ada | best08618/asylo | 5a520a9f5c461ede0f32acc284017b737a43898c | [
"Apache-2.0"
] | 2 | 2020-07-27T00:22:36.000Z | 2021-04-01T09:41:02.000Z | -- C41404A.ADA
-- Grant of Unlimited Rights
--
-- Under contracts F33600-87-D-0337, F33600-84-D-0280, MDA903-79-C-0687,
-- F08630-91-C-0015, and DCA100-97-D-0025, the U.S. Government obtained
-- unlimited rights in the software and documentation contained herein.
-- Unlimited rights are defined in DFAR 252.227-7013(a)(19). By making
-- this public release, the Government intends to confer upon all
-- recipients unlimited rights equal to those held by the Government.
-- These rights include rights to use, duplicate, release or disclose the
-- released technical data and computer software in whole or in part, in
-- any manner and for any purpose whatsoever, and to have or permit others
-- to do so.
--
-- DISCLAIMER
--
-- ALL MATERIALS OR INFORMATION HEREIN RELEASED, MADE AVAILABLE OR
-- DISCLOSED ARE AS IS. THE GOVERNMENT MAKES NO EXPRESS OR IMPLIED
-- WARRANTY AS TO ANY MATTER WHATSOEVER, INCLUDING THE CONDITIONS OF THE
-- SOFTWARE, DOCUMENTATION OR OTHER INFORMATION RELEASED, MADE AVAILABLE
-- OR DISCLOSED, OR THE OWNERSHIP, MERCHANTABILITY, OR FITNESS FOR A
-- PARTICULAR PURPOSE OF SAID MATERIAL.
--*
-- CHECK THAT THE PREFIX OF THE ARRAY ATTRIBUTES CAN BE THE VALUE OF AN
-- IMAGE ATTRIBUTE.
-- JBG 6/1/85
-- PWB 2/3/86 CORRECTED COMPARISON VALUES FOR 'LAST AND 'LENGTH.
WITH REPORT; USE REPORT;
PROCEDURE C41404A IS
TYPE ENUM IS (ONE, FOUR, 'C');
BEGIN
TEST ("C41404A", "CHECK WHEN PREFIX OF AN ATTRIBUTE IS 'IMAGE");
IF ENUM'IMAGE(FOUR)'LENGTH /= IDENT_INT(4) THEN
FAILED ("WRONG VALUE FOR LENGTH - ENUM");
END IF;
IF ENUM'IMAGE('C')'LENGTH /= IDENT_INT(3) THEN
FAILED ("WRONG VALUE FOR LENGTH - ENUM: 'C'");
END IF;
IF INTEGER'IMAGE(IDENT_INT(56))'LENGTH /= IDENT_INT(3) THEN
FAILED ("WRONG VALUE FOR LENGTH - INTEGER: 56");
END IF;
IF CHARACTER'IMAGE(IDENT_CHAR('B'))'LENGTH /= IDENT_INT(3) THEN
FAILED ("WRONG VALUE FOR LENGTH - CHAR: 'B'");
END IF;
IF ENUM'IMAGE(FOUR)'FIRST /= IDENT_INT(1) THEN
FAILED ("WRONG VALUE FOR FIRST - ENUM");
END IF;
IF ENUM'IMAGE('C')'FIRST(1) /= IDENT_INT(1) THEN
FAILED ("WRONG VALUE FOR FIRST - ENUM: 'C'");
END IF;
IF INTEGER'IMAGE(IDENT_INT(56))'FIRST /= IDENT_INT(1) THEN
FAILED ("WRONG VALUE FOR FIRST - INTEGER: 56");
END IF;
IF CHARACTER'IMAGE(IDENT_CHAR('B'))'FIRST /= IDENT_INT(1) THEN
FAILED ("WRONG VALUE FOR FIRST - CHAR: 'B'");
END IF;
IF ENUM'IMAGE(FOUR)'LAST /= IDENT_INT(4) THEN
FAILED ("WRONG VALUE FOR LAST - ENUM");
END IF;
IF ENUM'IMAGE('C')'LAST(1) /= IDENT_INT(3) THEN
FAILED ("WRONG VALUE FOR LAST - ENUM: 'C'");
END IF;
IF INTEGER'IMAGE(IDENT_INT(-56))'LAST /= IDENT_INT(3) THEN
FAILED ("WRONG VALUE FOR LAST - INTEGER: -56");
END IF;
IF CHARACTER'IMAGE(IDENT_CHAR('B'))'LAST /= IDENT_INT(3) THEN
FAILED ("WRONG VALUE FOR LAST - CHAR: 'B'");
END IF;
DECLARE
FOUR_VAR : STRING(ENUM'IMAGE(FOUR)'RANGE);
C_VAR : STRING(ENUM'IMAGE('C')'RANGE);
VAR_101 : STRING(INTEGER'IMAGE(IDENT_INT(101))'RANGE);
CHAR_VAR : STRING(CHARACTER'IMAGE(IDENT_CHAR('B'))'RANGE);
BEGIN
IF FOUR_VAR'FIRST /= 1 OR
FOUR_VAR'LAST /= 4 OR
FOUR_VAR'LENGTH /= 4 THEN
FAILED ("FOUR_VAR ATTRIBUTES INCORRECT. FIRST IS" &
INTEGER'IMAGE(FOUR_VAR'FIRST) & ". LAST IS" &
INTEGER'IMAGE(FOUR_VAR'LAST) & ". LENGTH IS" &
INTEGER'IMAGE(FOUR_VAR'LENGTH));
END IF;
IF C_VAR'FIRST /= 1 OR
C_VAR'LAST /= 3 OR
C_VAR'LENGTH /= 3 THEN
FAILED ("C_VAR ATTRIBUTES INCORRECT. FIRST IS" &
INTEGER'IMAGE(C_VAR'FIRST) & ". LAST IS" &
INTEGER'IMAGE(C_VAR'LAST) & ". LENGTH IS" &
INTEGER'IMAGE(C_VAR'LENGTH));
END IF;
IF VAR_101'FIRST /= 1 OR
VAR_101'LAST /= 4 OR
VAR_101'LENGTH /= 4 THEN
FAILED ("VAR_101 ATTRIBUTES INCORRECT. FIRST IS" &
INTEGER'IMAGE(VAR_101'FIRST) & ". LAST IS" &
INTEGER'IMAGE(VAR_101'LAST) & ". LENGTH IS" &
INTEGER'IMAGE(VAR_101'LENGTH));
END IF;
IF CHAR_VAR'FIRST /= 1 OR
CHAR_VAR'LAST /= 3 OR
CHAR_VAR'LENGTH /= 3 THEN
FAILED ("CHAR_VAR ATTRIBUTES INCORRECT. FIRST IS" &
INTEGER'IMAGE(CHAR_VAR'FIRST) & ". LAST IS" &
INTEGER'IMAGE(CHAR_VAR'LAST) & ". LENGTH IS" &
INTEGER'IMAGE(CHAR_VAR'LENGTH));
END IF;
END;
RESULT;
END C41404A;
| 36.467153 | 79 | 0.572058 |
3838caf9ecb6b38f5aa3bee0f130a64ca1feeb36 | 2,222 | ads | Ada | src/common/ascon-sponge.ads | damaki/libkeccak | d06217e525f7927380690d6c37b485bdbe8aa96e | [
"BSD-3-Clause"
] | 26 | 2015-09-20T17:52:38.000Z | 2021-07-29T21:47:04.000Z | src/common/ascon-sponge.ads | damaki/libkeccak | d06217e525f7927380690d6c37b485bdbe8aa96e | [
"BSD-3-Clause"
] | 3 | 2019-03-12T16:01:36.000Z | 2020-05-23T13:06:43.000Z | src/common/ascon-sponge.ads | damaki/libkeccak | d06217e525f7927380690d6c37b485bdbe8aa96e | [
"BSD-3-Clause"
] | 2 | 2019-04-15T18:02:19.000Z | 2020-11-22T11:22:18.000Z | -------------------------------------------------------------------------------
-- Copyright (c) 2019, Daniel King
-- All rights reserved.
--
-- Redistribution and use in source and binary forms, with or without
-- modification, are permitted provided that the following conditions are met:
-- * Redistributions of source code must retain the above copyright
-- notice, this list of conditions and the following disclaimer.
-- * Redistributions in binary form must reproduce the above copyright
-- notice, this list of conditions and the following disclaimer in the
-- documentation and/or other materials provided with the distribution.
-- * The name of the copyright holder may not be used to endorse or promote
-- Products derived from this software without specific prior written
-- permission.
--
-- THIS SOFTWARE IS PROVIDED BY THE COPYRIGHT HOLDERS AND CONTRIBUTORS "AS IS"
-- AND ANY EXPRESS OR IMPLIED WARRANTIES, INCLUDING, BUT NOT LIMITED TO, THE
-- IMPLIED WARRANTIES OF MERCHANTABILITY AND FITNESS FOR A PARTICULAR PURPOSE
-- ARE DISCLAIMED. IN NO EVENT SHALL THE COPYRIGHT HOLDER BE LIABLE FOR ANY
-- DIRECT, INDIRECT, INCIDENTAL, SPECIAL, EXEMPLARY, OR CONSEQUENTIAL DAMAGES
-- (INCLUDING, BUT NOT LIMITED TO, PROCUREMENT OF SUBSTITUTE GOODS OR SERVICES;
-- LOSS OF USE, DATA, OR PROFITS; OR BUSINESS INTERRUPTION) HOWEVER CAUSED AND
-- ON ANY THEORY OF LIABILITY, WHETHER IN CONTRACT, STRICT LIABILITY, OR TORT
-- (INCLUDING NEGLIGENCE OR OTHERWISE) ARISING IN ANY WAY OUT OF THE USE OF
-- THIS SOFTWARE, EVEN IF ADVISED OF THE POSSIBILITY OF SUCH DAMAGE.
-------------------------------------------------------------------------------
pragma SPARK_Mode (On);
with Ascon.Permutations;
with Keccak.Generic_Sponge;
with Keccak.Padding;
package Ascon.Sponge is new Keccak.Generic_Sponge
(State_Size_Bits => Ascon.State_Size_Bits,
State_Type => Ascon.State,
Init_State => Ascon.Init,
Permute => Ascon.Permutations.Permute_12,
XOR_Bits_Into_State => Ascon.XOR_Bits_Into_State,
Extract_Data => Ascon.Extract_Bytes,
Pad => Keccak.Padding.Pad10_Multi_Blocks_Big_Endian);
| 54.195122 | 80 | 0.680018 |
9a6ff0760118bcd80983cab592a1cbca55ba237c | 7,169 | adb | Ada | source/tasking/machine-apple-darwin/s-syobab.adb | ytomino/drake | 4e4bdcd8b8e23a11a29b31d3a8861fdf60090ea2 | [
"MIT"
] | 33 | 2015-04-04T09:19:36.000Z | 2021-11-10T05:33:34.000Z | source/tasking/machine-apple-darwin/s-syobab.adb | ytomino/drake | 4e4bdcd8b8e23a11a29b31d3a8861fdf60090ea2 | [
"MIT"
] | 8 | 2017-11-14T13:05:07.000Z | 2018-08-09T15:28:49.000Z | source/tasking/machine-apple-darwin/s-syobab.adb | ytomino/drake | 4e4bdcd8b8e23a11a29b31d3a8861fdf60090ea2 | [
"MIT"
] | 9 | 2015-02-03T17:09:53.000Z | 2021-11-12T01:16:05.000Z | with System.Native_Real_Time;
with System.Native_Time;
with System.Tasks;
with System.Debug; -- assertions
with C.errno;
with C.poll;
package body System.Synchronous_Objects.Abortable is
use type Native_Time.Nanosecond_Number;
use type C.signed_int;
use type C.unsigned_short;
type struct_pollfd_array is
array (C.size_t range <>) of aliased C.poll.struct_pollfd
with Convention => C;
pragma Suppress_Initialization (struct_pollfd_array);
-- queue
procedure Take (
Object : in out Queue;
Item : out Queue_Node_Access;
Params : Address;
Filter : Queue_Filter;
Aborted : out Boolean) is
begin
Aborted := Tasks.Is_Aborted;
Enter (Object.Mutex.all);
declare
Previous : Queue_Node_Access := null;
I : Queue_Node_Access := Object.Head;
begin
Taking : loop
Take_No_Sync (Object, Item, Params, Filter, Previous, I);
exit Taking when Item /= null;
-- not found
declare
Tail_On_Waiting : constant Queue_Node_Access := Object.Tail;
begin
Object.Params := Params;
Object.Filter := Filter;
loop
Object.Waiting := True;
Leave (Object.Mutex.all);
Wait (Object.Pipe, Aborted => Aborted);
if not Aborted then
Read_1 (Object.Pipe.Reading_Pipe);
end if;
Enter (Object.Mutex.all);
Object.Waiting := False;
exit Taking when Aborted;
exit when Object.Tail /= Tail_On_Waiting;
end loop;
if Tail_On_Waiting /= null then
Previous := Tail_On_Waiting;
I := Tail_On_Waiting.Next;
else
Previous := null;
I := Object.Head;
end if;
end;
end loop Taking;
end;
Leave (Object.Mutex.all);
end Take;
-- event
procedure Wait (
Object : in out Event;
Aborted : out Boolean)
is
Abort_Event : constant access Event := Tasks.Abort_Event;
begin
if Abort_Event /= null then
declare
Polling : aliased struct_pollfd_array (0 .. 1);
begin
Polling (0).fd := Object.Reading_Pipe;
Polling (0).events :=
C.signed_short (
C.unsigned_short'(C.poll.POLLIN or C.poll.POLLERR));
Polling (1).fd := Abort_Event.Reading_Pipe;
Polling (1).events :=
C.signed_short (
C.unsigned_short'(C.poll.POLLIN or C.poll.POLLERR));
loop
declare
R : C.signed_int;
Value : Boolean;
begin
R := C.poll.poll (
Polling (0)'Access,
2,
-1); -- waiting indefinitely
if R > 0 then
pragma Check (Debug,
Check =>
((C.unsigned_short (Polling (0).revents)
and C.poll.POLLERR) = 0
and then (C.unsigned_short (Polling (0).revents)
and C.poll.POLLERR) = 0)
or else Debug.Runtime_Error ("POLLERR"));
Value :=
(C.unsigned_short (Polling (0).revents)
and C.poll.POLLIN) /= 0;
Aborted :=
(C.unsigned_short (Polling (1).revents)
and C.poll.POLLIN) /= 0;
exit when Value or else Aborted;
end if;
pragma Check (Debug,
Check =>
not (R < 0)
or else C.errno.errno = C.errno.EINTR
or else Debug.Runtime_Error ("poll failed"));
end;
end loop;
end;
else
Wait (Object);
Aborted := Tasks.Is_Aborted;
end if;
end Wait;
procedure Wait (
Object : in out Event;
Timeout : Duration;
Value : out Boolean;
Aborted : out Boolean)
is
Abort_Event : constant access Event := Tasks.Abort_Event;
begin
if Abort_Event /= null then
declare
Deadline : constant Duration :=
Native_Real_Time.To_Duration (Native_Real_Time.Clock) + Timeout;
Span : Duration := Timeout;
Polling : aliased struct_pollfd_array (0 .. 1);
begin
Polling (0).fd := Object.Reading_Pipe;
Polling (0).events :=
C.signed_short (
C.unsigned_short'(C.poll.POLLIN or C.poll.POLLERR));
Polling (1).fd := Abort_Event.Reading_Pipe;
Polling (1).events :=
C.signed_short (
C.unsigned_short'(C.poll.POLLIN or C.poll.POLLERR));
loop
declare
Nanoseconds : constant Native_Time.Nanosecond_Number :=
Native_Time.Nanosecond_Number'Integer_Value (Span);
Milliseconds : constant C.signed_int :=
C.signed_int'Max (
C.signed_int (Nanoseconds / 1_000_000),
0);
R : C.signed_int;
begin
R := C.poll.poll (Polling (0)'Access, 2, Milliseconds);
if R > 0 then
pragma Check (Debug,
Check =>
((C.unsigned_short (Polling (0).revents)
and C.poll.POLLERR) = 0
and then (C.unsigned_short (Polling (1).revents)
and C.poll.POLLERR) = 0)
or else Debug.Runtime_Error ("POLLERR"));
Value :=
(C.unsigned_short (Polling (0).revents)
and C.poll.POLLIN) /= 0;
Aborted :=
(C.unsigned_short (Polling (1).revents)
and C.poll.POLLIN) /= 0;
exit when Value or else Aborted;
end if;
pragma Check (Debug,
Check =>
not (R < 0)
or else C.errno.errno = C.errno.EINTR
or else Debug.Runtime_Error ("poll failed"));
end;
Span :=
Deadline
- Native_Real_Time.To_Duration (Native_Real_Time.Clock);
if Span <= 0.0 then -- timeout
Value := False;
Aborted := Tasks.Is_Aborted;
exit;
end if;
end loop;
end;
else
Wait (Object, Timeout, Value);
Aborted := Tasks.Is_Aborted;
end if;
end Wait;
end System.Synchronous_Objects.Abortable;
| 36.207071 | 79 | 0.467429 |
3837d1433f87a0c9ad71ad8ea68daab3a837f595 | 4,378 | adb | Ada | src/timers/agate-timer__systick.adb | Fabien-Chouteau/AGATE | cd8dbc54c1c70379c833e7cd710e2326ad6e9a91 | [
"BSD-3-Clause"
] | 3 | 2017-12-23T10:25:07.000Z | 2021-06-09T13:47:19.000Z | src/timers/agate-timer__systick.adb | Fabien-Chouteau/AGATE | cd8dbc54c1c70379c833e7cd710e2326ad6e9a91 | [
"BSD-3-Clause"
] | null | null | null | src/timers/agate-timer__systick.adb | Fabien-Chouteau/AGATE | cd8dbc54c1c70379c833e7cd710e2326ad6e9a91 | [
"BSD-3-Clause"
] | null | null | null | ------------------------------------------------------------------------------
-- --
-- Copyright (C) 2017-2020, Fabien Chouteau --
-- --
-- Redistribution and use in source and binary forms, with or without --
-- modification, are permitted provided that the following conditions are --
-- met: --
-- 1. Redistributions of source code must retain the above copyright --
-- notice, this list of conditions and the following disclaimer. --
-- 2. Redistributions in binary form must reproduce the above copyright --
-- notice, this list of conditions and the following disclaimer in --
-- the documentation and/or other materials provided with the --
-- distribution. --
-- 3. Neither the name of the copyright holder nor the names of its --
-- contributors may be used to endorse or promote products derived --
-- from this software without specific prior written permission. --
-- --
-- THIS SOFTWARE IS PROVIDED BY THE COPYRIGHT HOLDERS AND CONTRIBUTORS --
-- "AS IS" AND ANY EXPRESS OR IMPLIED WARRANTIES, INCLUDING, BUT NOT --
-- LIMITED TO, THE IMPLIED WARRANTIES OF MERCHANTABILITY AND FITNESS FOR --
-- A PARTICULAR PURPOSE ARE DISCLAIMED. IN NO EVENT SHALL THE COPYRIGHT --
-- HOLDER OR CONTRIBUTORS BE LIABLE FOR ANY DIRECT, INDIRECT, INCIDENTAL, --
-- SPECIAL, EXEMPLARY, OR CONSEQUENTIAL DAMAGES (INCLUDING, BUT NOT --
-- LIMITED TO, PROCUREMENT OF SUBSTITUTE GOODS OR SERVICES; LOSS OF USE, --
-- DATA, OR PROFITS; OR BUSINESS INTERRUPTION) HOWEVER CAUSED AND ON ANY --
-- THEORY OF LIABILITY, WHETHER IN CONTRACT, STRICT LIABILITY, OR TORT --
-- (INCLUDING NEGLIGENCE OR OTHERWISE) ARISING IN ANY WAY OUT OF THE USE --
-- OF THIS SOFTWARE, EVEN IF ADVISED OF THE POSSIBILITY OF SUCH DAMAGE. --
-- --
------------------------------------------------------------------------------
with Cortex_M_SVD.SysTick; use Cortex_M_SVD.SysTick;
with AGATE.Scheduler; use AGATE.Scheduler;
with Cortex_M_SVD.SCB; use Cortex_M_SVD.SCB;
package body AGATE.Timer is
Tick_Period : constant := 168_000_000 / 1_000;
Next_Tick : Time;
procedure Initialize;
procedure Timer_Handler;
pragma Export (C, Timer_Handler, "SysTick_Handler");
procedure Clear_Timer_Interrupt;
----------------
-- Initialize --
----------------
procedure Initialize
is
CSR : Word with Volatile, Address => SysTick_Periph.CSR'Address;
begin
Next_Tick := Time (Tick_Period);
SysTick_Periph.RVR.RELOAD := Tick_Period - 1;
SysTick_Periph.CSR.ENABLE := Enable;
Clear_Timer_Interrupt;
-- SysTick_Periph.CSR.TICKINT := Enable;
-- Workaround...
CSR := CSR or 2**1;
end Initialize;
---------------------------
-- Clear_Timer_Interrupt --
---------------------------
procedure Clear_Timer_Interrupt
is
begin
SCB_Periph.ICSR.PENDSTCLR := True;
end Clear_Timer_Interrupt;
-------------------
-- Timer_Handler --
-------------------
procedure Timer_Handler
is
begin
AGATE.Scheduler.Wakeup_Expired_Alarms;
Clear_Timer_Interrupt;
end Timer_Handler;
-----------
-- Clock --
-----------
function Clock return Time
is
Ret : Time;
Count : UInt24;
begin
Count := SysTick_Periph.CVR.CURRENT;
if SysTick_Periph.CSR.COUNTFLAG then
Ret := Next_Tick;
Next_Tick := Next_Tick + Tick_Period;
else
Ret := Next_Tick - Time (Count);
end if;
return Ret;
end Clock;
---------------
-- Set_Alarm --
---------------
procedure Set_Alarm (Alarm_Time : Time)
is
begin
-- There's no alarm timer in the SysTick implementation. Instead the
-- system gets an interrupt at a given frequency (the tick).
null;
end Set_Alarm;
begin
Initialize;
end AGATE.Timer;
| 34.746032 | 78 | 0.542714 |
3156f0b96999e0816322cb1bc3f07a018725d65c | 6,132 | adb | Ada | src/wavefiles_gtk-menu.adb | silentTeee/ada_wavefiles_gtk_app | a0c6682131dc4f49a6442fb2a44d906a49d9a18c | [
"MIT"
] | null | null | null | src/wavefiles_gtk-menu.adb | silentTeee/ada_wavefiles_gtk_app | a0c6682131dc4f49a6442fb2a44d906a49d9a18c | [
"MIT"
] | 2 | 2021-09-10T16:10:10.000Z | 2021-09-15T17:04:48.000Z | src/wavefiles_gtk-menu.adb | silentTeee/ada_wavefiles_gtk_app | a0c6682131dc4f49a6442fb2a44d906a49d9a18c | [
"MIT"
] | 1 | 2021-09-09T18:51:02.000Z | 2021-09-09T18:51:02.000Z | -------------------------------------------------------------------------------
--
-- WAVEFILES GTK APPLICATION
--
-- Application menu
--
-- The MIT License (MIT)
--
-- Copyright (c) 2017 Gustavo A. Hoffmann
--
-- Permission is hereby granted, free of charge, to any person obtaining a copy
-- of this software and associated documentation files (the "Software"), to
-- deal in the Software without restriction, including without limitation the
-- rights to use, copy, modify, merge, publish, distribute, sublicense, and /
-- or sell copies of the Software, and to permit persons to whom the Software
-- is furnished to do so, subject to the following conditions:
--
-- The above copyright notice and this permission notice shall be included in
-- all copies or substantial portions of the Software.
--
-- THE SOFTWARE IS PROVIDED "AS IS", WITHOUT WARRANTY OF ANY KIND, EXPRESS OR
-- IMPLIED, INCLUDING BUT NOT LIMITED TO THE WARRANTIES OF MERCHANTABILITY,
-- FITNESS FOR A PARTICULAR PURPOSE AND NONINFRINGEMENT. IN NO EVENT SHALL THE
-- AUTHORS OR COPYRIGHT HOLDERS BE LIABLE FOR ANY CLAIM, DAMAGES OR OTHER
-- LIABILITY, WHETHER IN AN ACTION OF CONTRACT, TORT OR OTHERWISE, ARISING
-- FROM, OUT OF OR IN CONNECTION WITH THE SOFTWARE OR THE USE OR OTHER DEALINGS
-- IN THE SOFTWARE.
-------------------------------------------------------------------------------
with Gtk.Menu;
with Gtk.Menu_Bar;
with Gtk.Menu_Item;
with Gtk.Handlers;
with Gdk.Event;
with Gtk.File_Chooser_Dialog;
with Gtk.File_Chooser;
with Gtk.Dialog;
with Gtk.Widget;
with Gtk.About_Dialog;
with Gtk.File_Filter;
with WaveFiles_Gtk.Wavefile_List;
package body WaveFiles_Gtk.Menu is
package Item_Handler is new Gtk.Handlers.Return_Callback
(Gtk.Menu_Item.Gtk_Menu_Item_Record, Boolean);
function Open_File
(Menu_Item : access Gtk.Menu_Item.Gtk_Menu_Item_Record'Class;
Event : Gdk.Event.Gdk_Event)
return Boolean;
function Quit_App
(Menu_Item : access Gtk.Menu_Item.Gtk_Menu_Item_Record'Class;
Event : Gdk.Event.Gdk_Event)
return Boolean;
function About_App
(Menu_Item : access Gtk.Menu_Item.Gtk_Menu_Item_Record'Class;
Event : Gdk.Event.Gdk_Event)
return Boolean;
---------------
-- Open_File --
---------------
function Open_File
(Menu_Item : access Gtk.Menu_Item.Gtk_Menu_Item_Record'Class;
Event : Gdk.Event.Gdk_Event)
return Boolean
is
pragma Unreferenced (Menu_Item, Event);
Dialog : Gtk.File_Chooser_Dialog.Gtk_File_Chooser_Dialog;
Filter : Gtk.File_Filter.Gtk_File_Filter;
Button : Gtk.Widget.Gtk_Widget;
pragma Unreferenced (Button);
use type Gtk.Dialog.Gtk_Response_Type;
begin
Gtk.File_Chooser_Dialog.Gtk_New (Dialog => Dialog,
Title => "Select input wavefile",
Parent => WaveFiles_Gtk.Get_Window,
Action => Gtk.File_Chooser.Action_Open);
Button := Dialog.Add_Button ("OK", Gtk.Dialog.Gtk_Response_OK);
Button := Dialog.Add_Button ("Cancel", Gtk.Dialog.Gtk_Response_Cancel);
Gtk.File_Filter.Gtk_New (Filter);
Filter.Set_Name ("Wavefiles");
Filter.Add_Mime_Type ("audio/wav");
Dialog.Add_Filter (Filter);
if Dialog.Run = Gtk.Dialog.Gtk_Response_OK then
WaveFiles_Gtk.Wavefile_List.Insert (Dialog.Get_Filename);
end if;
Dialog.Destroy;
return True;
end Open_File;
--------------
-- Quit_App --
--------------
function Quit_App
(Menu_Item : access Gtk.Menu_Item.Gtk_Menu_Item_Record'Class;
Event : Gdk.Event.Gdk_Event)
return Boolean is
pragma Unreferenced (Menu_Item, Event);
begin
WaveFiles_Gtk.Destroy_Window;
return True;
end Quit_App;
---------------
-- About_App --
---------------
function About_App
(Menu_Item : access Gtk.Menu_Item.Gtk_Menu_Item_Record'Class;
Event : Gdk.Event.Gdk_Event)
return Boolean is
pragma Unreferenced (Menu_Item, Event);
Dialog : Gtk.About_Dialog.Gtk_About_Dialog;
R : Gtk.Dialog.Gtk_Response_Type;
pragma Unreferenced (R);
begin
Dialog := Gtk.About_Dialog.Gtk_About_Dialog_New;
Dialog.Set_Transient_For (WaveFiles_Gtk.Get_Window);
Dialog.Set_Modal (True);
R := Dialog.Run;
Dialog.Destroy;
return True;
end About_App;
------------
-- Create --
------------
procedure Create is
Menu_Bar : Gtk.Menu_Bar.Gtk_Menu_Bar;
Menu : Gtk.Menu.Gtk_Menu;
Menu_Item : Gtk.Menu_Item.Gtk_Menu_Item;
Menu_Subitem : Gtk.Menu_Item.Gtk_Menu_Item;
begin
Gtk.Menu_Bar.Gtk_New (Menu_Bar);
WaveFiles_Gtk.Get_VBox.Pack_Start (Menu_Bar, False, False, 0);
Gtk.Menu_Item.Gtk_New (Menu_Item, "File");
Gtk.Menu.Gtk_New (Menu);
Gtk.Menu_Item.Gtk_New (Menu_Subitem, "Open File...");
Item_Handler.Connect
(Widget => Menu_Subitem,
Name => "button_press_event",
Marsh => Item_Handler.To_Marshaller (Open_File'Access),
After => False);
Menu.Append (Menu_Subitem);
Gtk.Menu_Item.Gtk_New (Menu_Subitem, "Quit");
Item_Handler.Connect
(Widget => Menu_Subitem,
Name => "button_press_event",
Marsh => Item_Handler.To_Marshaller (Quit_App'Access),
After => False);
Menu.Append (Menu_Subitem);
Menu_Item.Set_Submenu (Menu);
Menu_Bar.Append (Menu_Item);
Gtk.Menu_Item.Gtk_New (Menu_Item, "Help");
Gtk.Menu.Gtk_New (Menu);
Gtk.Menu_Item.Gtk_New (Menu_Subitem, "About...");
Item_Handler.Connect
(Widget => Menu_Subitem,
Name => "button_press_event",
Marsh => Item_Handler.To_Marshaller (About_App'Access),
After => False);
Menu.Append (Menu_Subitem);
Menu_Item.Set_Submenu (Menu);
Menu_Bar.Append (Menu_Item);
end Create;
end WaveFiles_Gtk.Menu;
| 31.608247 | 79 | 0.631768 |
ad316eb4b72b8e860a7f41e8151284caa4301895 | 8,729 | adb | Ada | Validation/pyFrame3DD-master/gcc-master/gcc/ada/fname.adb | djamal2727/Main-Bearing-Analytical-Model | 2f00c2219c71be0175c6f4f8f1d4cca231d97096 | [
"Apache-2.0"
] | null | null | null | Validation/pyFrame3DD-master/gcc-master/gcc/ada/fname.adb | djamal2727/Main-Bearing-Analytical-Model | 2f00c2219c71be0175c6f4f8f1d4cca231d97096 | [
"Apache-2.0"
] | null | null | null | Validation/pyFrame3DD-master/gcc-master/gcc/ada/fname.adb | djamal2727/Main-Bearing-Analytical-Model | 2f00c2219c71be0175c6f4f8f1d4cca231d97096 | [
"Apache-2.0"
] | null | null | null | ------------------------------------------------------------------------------
-- --
-- GNAT COMPILER COMPONENTS --
-- --
-- F N A M E --
-- --
-- B o d y --
-- --
-- Copyright (C) 1992-2020, Free Software Foundation, Inc. --
-- --
-- GNAT is free software; you can redistribute it and/or modify it under --
-- terms of the GNU General Public License as published by the Free Soft- --
-- ware Foundation; either version 3, or (at your option) any later ver- --
-- sion. GNAT is distributed in the hope that it will be useful, but WITH- --
-- OUT ANY WARRANTY; without even the implied warranty of MERCHANTABILITY --
-- or FITNESS FOR A PARTICULAR PURPOSE. --
-- --
-- As a special exception under Section 7 of GPL version 3, you are granted --
-- additional permissions described in the GCC Runtime Library Exception, --
-- version 3.1, as published by the Free Software Foundation. --
-- --
-- You should have received a copy of the GNU General Public License and --
-- a copy of the GCC Runtime Library Exception along with this program; --
-- see the files COPYING3 and COPYING.RUNTIME respectively. If not, see --
-- <http://www.gnu.org/licenses/>. --
-- --
-- GNAT was originally developed by the GNAT team at New York University. --
-- Extensive contributions were provided by Ada Core Technologies Inc. --
-- --
------------------------------------------------------------------------------
package body Fname is
function Has_Internal_Extension (Fname : String) return Boolean;
pragma Inline (Has_Internal_Extension);
-- True if the extension is appropriate for an internal/predefined unit.
-- That means ".ads" or ".adb" for source files, and ".ali" for ALI files.
function Has_Prefix (X, Prefix : String) return Boolean;
pragma Inline (Has_Prefix);
-- True if Prefix is at the beginning of X. For example,
-- Has_Prefix ("a-filename.ads", Prefix => "a-") is True.
----------------------------
-- Has_Internal_Extension --
----------------------------
function Has_Internal_Extension (Fname : String) return Boolean is
begin
if Fname'Length >= 4 then
declare
S : String renames Fname (Fname'Last - 3 .. Fname'Last);
begin
return S = ".ads" or else S = ".adb" or else S = ".ali";
end;
end if;
return False;
end Has_Internal_Extension;
----------------
-- Has_Prefix --
----------------
function Has_Prefix (X, Prefix : String) return Boolean is
begin
if X'Length >= Prefix'Length then
declare
S : String renames X (X'First .. X'First + Prefix'Length - 1);
begin
return S = Prefix;
end;
end if;
return False;
end Has_Prefix;
-----------------------
-- Is_GNAT_File_Name --
-----------------------
function Is_GNAT_File_Name (Fname : String) return Boolean is
begin
-- Check for internal extensions before checking prefixes, so we don't
-- think (e.g.) "gnat.adc" is internal.
if not Has_Internal_Extension (Fname) then
return False;
end if;
-- Definitely internal if prefix is g-
if Has_Prefix (Fname, "g-") then
return True;
end if;
-- See the note in Is_Predefined_File_Name for the rationale
return Fname'Length = 8 and then Has_Prefix (Fname, "gnat");
end Is_GNAT_File_Name;
function Is_GNAT_File_Name (Fname : File_Name_Type) return Boolean is
Result : constant Boolean :=
Is_GNAT_File_Name (Get_Name_String (Fname));
begin
return Result;
end Is_GNAT_File_Name;
---------------------------
-- Is_Internal_File_Name --
---------------------------
function Is_Internal_File_Name
(Fname : String;
Renamings_Included : Boolean := True) return Boolean
is
begin
if Is_Predefined_File_Name (Fname, Renamings_Included) then
return True;
end if;
return Is_GNAT_File_Name (Fname);
end Is_Internal_File_Name;
function Is_Internal_File_Name
(Fname : File_Name_Type;
Renamings_Included : Boolean := True) return Boolean
is
Result : constant Boolean :=
Is_Internal_File_Name
(Get_Name_String (Fname), Renamings_Included);
begin
return Result;
end Is_Internal_File_Name;
-----------------------------
-- Is_Predefined_File_Name --
-----------------------------
function Is_Predefined_File_Name
(Fname : String;
Renamings_Included : Boolean := True) return Boolean
is
begin
-- Definitely false if longer than 12 characters (8.3)
-- except for the Interfaces packages
if Fname'Length > 12
and then Fname (Fname'First .. Fname'First + 1) /= "i-"
then
return False;
end if;
if not Has_Internal_Extension (Fname) then
return False;
end if;
-- Definitely predefined if prefix is a- i- or s-
if Fname'Length >= 2 then
declare
S : String renames Fname (Fname'First .. Fname'First + 1);
begin
if S = "a-" or else S = "i-" or else S = "s-" then
return True;
end if;
end;
end if;
-- We include the "." in the prefixes below, so we don't match (e.g.)
-- adamant.ads. So the first line matches "ada.ads", "ada.adb", and
-- "ada.ali". But that's not necessary if they have 8 characters.
if Has_Prefix (Fname, "ada.") -- Ada
or else Has_Prefix (Fname, "interfac") -- Interfaces
or else Has_Prefix (Fname, "system.a") -- System
then
return True;
end if;
-- If instructed and the name has 8+ characters, check for renamings
if Renamings_Included
and then Is_Predefined_Renaming_File_Name (Fname)
then
return True;
end if;
return False;
end Is_Predefined_File_Name;
function Is_Predefined_File_Name
(Fname : File_Name_Type;
Renamings_Included : Boolean := True) return Boolean
is
Result : constant Boolean :=
Is_Predefined_File_Name
(Get_Name_String (Fname), Renamings_Included);
begin
return Result;
end Is_Predefined_File_Name;
--------------------------------------
-- Is_Predefined_Renaming_File_Name --
--------------------------------------
function Is_Predefined_Renaming_File_Name
(Fname : String) return Boolean
is
subtype Str8 is String (1 .. 8);
Renaming_Names : constant array (1 .. 8) of Str8 :=
("calendar", -- Calendar
"machcode", -- Machine_Code
"unchconv", -- Unchecked_Conversion
"unchdeal", -- Unchecked_Deallocation
"directio", -- Direct_IO
"ioexcept", -- IO_Exceptions
"sequenio", -- Sequential_IO
"text_io."); -- Text_IO
begin
-- Definitely false if longer than 12 characters (8.3)
if Fname'Length in 8 .. 12 then
declare
S : String renames Fname (Fname'First .. Fname'First + 7);
begin
for J in Renaming_Names'Range loop
if S = Renaming_Names (J) then
return True;
end if;
end loop;
end;
end if;
return False;
end Is_Predefined_Renaming_File_Name;
function Is_Predefined_Renaming_File_Name
(Fname : File_Name_Type) return Boolean is
Result : constant Boolean :=
Is_Predefined_Renaming_File_Name (Get_Name_String (Fname));
begin
return Result;
end Is_Predefined_Renaming_File_Name;
end Fname;
| 35.48374 | 78 | 0.513003 |
1df2dc5f589fb1b26d32484c25a49cfd89367f85 | 4,429 | adb | Ada | arch/ARM/STM32/driver_demos/demo_timer_quad_encoder/src/motor.adb | shakram02/Ada_Drivers_Library | a407ca7ddbc2d9756647016c2f8fd8ef24a239ff | [
"BSD-3-Clause"
] | 192 | 2016-06-01T18:32:04.000Z | 2022-03-26T22:52:31.000Z | arch/ARM/STM32/driver_demos/demo_timer_quad_encoder/src/motor.adb | shakram02/Ada_Drivers_Library | a407ca7ddbc2d9756647016c2f8fd8ef24a239ff | [
"BSD-3-Clause"
] | 239 | 2016-05-26T20:02:01.000Z | 2022-03-31T09:46:56.000Z | arch/ARM/STM32/driver_demos/demo_timer_quad_encoder/src/motor.adb | shakram02/Ada_Drivers_Library | a407ca7ddbc2d9756647016c2f8fd8ef24a239ff | [
"BSD-3-Clause"
] | 142 | 2016-06-05T08:12:20.000Z | 2022-03-24T17:37:17.000Z | ------------------------------------------------------------------------------
-- --
-- Copyright (C) 2015-2017, AdaCore --
-- --
-- Redistribution and use in source and binary forms, with or without --
-- modification, are permitted provided that the following conditions are --
-- met: --
-- 1. Redistributions of source code must retain the above copyright --
-- notice, this list of conditions and the following disclaimer. --
-- 2. Redistributions in binary form must reproduce the above copyright --
-- notice, this list of conditions and the following disclaimer in --
-- the documentation and/or other materials provided with the --
-- distribution. --
-- 3. Neither the name of the copyright holder nor the names of its --
-- contributors may be used to endorse or promote products derived --
-- from this software without specific prior written permission. --
-- --
-- THIS SOFTWARE IS PROVIDED BY THE COPYRIGHT HOLDERS AND CONTRIBUTORS --
-- "AS IS" AND ANY EXPRESS OR IMPLIED WARRANTIES, INCLUDING, BUT NOT --
-- LIMITED TO, THE IMPLIED WARRANTIES OF MERCHANTABILITY AND FITNESS FOR --
-- A PARTICULAR PURPOSE ARE DISCLAIMED. IN NO EVENT SHALL THE COPYRIGHT --
-- HOLDER OR CONTRIBUTORS BE LIABLE FOR ANY DIRECT, INDIRECT, INCIDENTAL, --
-- SPECIAL, EXEMPLARY, OR CONSEQUENTIAL DAMAGES (INCLUDING, BUT NOT --
-- LIMITED TO, PROCUREMENT OF SUBSTITUTE GOODS OR SERVICES; LOSS OF USE, --
-- DATA, OR PROFITS; OR BUSINESS INTERRUPTION) HOWEVER CAUSED AND ON ANY --
-- THEORY OF LIABILITY, WHETHER IN CONTRACT, STRICT LIABILITY, OR TORT --
-- (INCLUDING NEGLIGENCE OR OTHERWISE) ARISING IN ANY WAY OUT OF THE USE --
-- OF THIS SOFTWARE, EVEN IF ADVISED OF THE POSSIBILITY OF SUCH DAMAGE. --
-- --
------------------------------------------------------------------------------
package body Motor is
procedure Initialize;
-----------------------
-- Current_Direction --
-----------------------
function Current_Direction return Direction is
begin
case Current_Counter_Mode (Encoder_Timer) is
when Up => return Forward;
when Down => return Backward;
when others => raise Program_Error;
end case;
end Current_Direction;
-------------------
-- Encoder_Count --
-------------------
function Encoder_Count return UInt32 is
begin
return Current_Counter (Encoder_Timer);
end Encoder_Count;
----------------
-- Initialize --
----------------
procedure Initialize is
begin
Enable_Clock (Encoder_Tach0);
Enable_Clock (Encoder_Tach1);
Enable_Clock (Encoder_Timer);
Configure_IO
(Encoder_Tach0 & Encoder_Tach1,
(Mode => Mode_AF,
AF => Encoder_AF,
Resistors => Pull_Up,
AF_Output_Type => Push_Pull,
AF_Speed => Speed_100MHz));
Configure_Encoder_Interface
(Encoder_Timer,
Mode => Encoder_Mode_TI1_TI2,
IC1_Polarity => Rising,
IC2_Polarity => Rising);
Configure
(Encoder_Timer,
Prescaler => 0,
Period => UInt32 (UInt16'Last),
Clock_Divisor => Div1,
Counter_Mode => Up);
Configure_Channel_Input
(Encoder_Timer,
Channel => Channel_1,
Polarity => Rising,
Selection => Direct_TI,
Prescaler => Div1,
Filter => 0);
Configure_Channel_Input
(Encoder_Timer,
Channel => Channel_2,
Polarity => Rising,
Selection => Direct_TI,
Prescaler => Div1,
Filter => 0);
Enable_Channel (Encoder_Timer, Channel_1);
Enable_Channel (Encoder_Timer, Channel_2);
Set_Counter (Encoder_Timer, UInt16'(0));
Enable (Encoder_Timer);
end Initialize;
begin
Initialize;
end Motor;
| 37.854701 | 78 | 0.522917 |
9a226bc98770152964846d3cae0eeb3083730483 | 17,065 | adb | Ada | scheduling-initialize_parameters.adb | annexi-strayline/AURA | fbbc4bc963ee82872a67e088b68f0565ba5b50a7 | [
"BSD-3-Clause"
] | 13 | 2021-09-28T18:14:32.000Z | 2022-02-09T17:48:53.000Z | scheduling-initialize_parameters.adb | annexi-strayline/AURA | fbbc4bc963ee82872a67e088b68f0565ba5b50a7 | [
"BSD-3-Clause"
] | 9 | 2021-09-28T19:18:25.000Z | 2022-01-14T22:54:06.000Z | scheduling-initialize_parameters.adb | annexi-strayline/AURA | fbbc4bc963ee82872a67e088b68f0565ba5b50a7 | [
"BSD-3-Clause"
] | 1 | 2021-10-21T21:19:08.000Z | 2021-10-21T21:19:08.000Z | ------------------------------------------------------------------------------
-- --
-- Ada User Repository Annex (AURA) --
-- ANNEXI-STRAYLINE Reference Implementation --
-- --
-- Command Line Interface --
-- --
-- ------------------------------------------------------------------------ --
-- --
-- Copyright (C) 2020-2021, ANNEXI-STRAYLINE Trans-Human Ltd. --
-- All rights reserved. --
-- --
-- Original Contributors: --
-- * Richard Wai (ANNEXI-STRAYLINE) --
-- --
-- Redistribution and use in source and binary forms, with or without --
-- modification, are permitted provided that the following conditions are --
-- met: --
-- --
-- * Redistributions of source code must retain the above copyright --
-- notice, this list of conditions and the following disclaimer. --
-- --
-- * Redistributions in binary form must reproduce the above copyright --
-- notice, this list of conditions and the following disclaimer in --
-- the documentation and/or other materials provided with the --
-- distribution. --
-- --
-- * Neither the name of the copyright holder nor the names of its --
-- contributors may be used to endorse or promote products derived --
-- from this software without specific prior written permission. --
-- --
-- THIS SOFTWARE IS PROVIDED BY THE COPYRIGHT HOLDERS AND CONTRIBUTORS --
-- "AS IS" AND ANY EXPRESS OR IMPLIED WARRANTIES, INCLUDING, BUT NOT --
-- LIMITED TO, THE IMPLIED WARRANTIES OF MERCHANTABILITY AND FITNESS FOR A --
-- PARTICULAR PURPOSE ARE DISCLAIMED. IN NO EVENT SHALL THE COPYRIGHT --
-- OWNER OR CONTRIBUTORS BE LIABLE FOR ANY DIRECT, INDIRECT, INCIDENTAL, --
-- SPECIAL, EXEMPLARY, OR CONSEQUENTIAL DAMAGES (INCLUDING, BUT NOT --
-- LIMITED TO, PROCUREMENT OF SUBSTITUTE GOODS OR SERVICES; LOSS OF USE, --
-- DATA, OR PROFITS; OR BUSINESS INTERRUPTION) HOWEVER CAUSED AND ON ANY --
-- THEORY OF LIABILITY, WHETHER IN CONTRACT, STRICT LIABILITY, OR TORT --
-- (INCLUDING NEGLIGENCE OR OTHERWISE) ARISING IN ANY WAY OUT OF THE USE --
-- OF THIS SOFTWARE, EVEN IF ADVISED OF THE POSSIBILITY OF SUCH DAMAGE. --
-- --
------------------------------------------------------------------------------
with Ada.Strings.Fixed;
with Platform_Info;
separate (Scheduling)
procedure Initialize_Parameters is
use UBS;
use all type Build.Build_Mode;
use all type Build.Link_Mode;
use all type Build.Compile_Optimization_Mode;
Arg_Count: constant Natural := Ada.Command_Line.Argument_Count;
Options_Start: Positive;
-- Indicates the index into the Arguments vector containing the first
-- option
function Argument (Number: in Positive) return String
renames Ada.Command_Line.Argument;
Arg: Unbounded_String;
procedure Unrecognized_Option is
begin
UI.Put_Fail_Tag;
Put_Line (" Unrecognized option """ & To_String (Arg) & """.");
Command := Help_Command;
end Unrecognized_Option;
function Is_Option (Arg_S: in String) return Boolean is
(Ada.Strings.Fixed.Head (Arg_S, 1) = "-");
procedure Check_Option_Start (Arg_S : in String;
Expected: in String;
After : out Positive)
is
-- If Expected matches the beginning of Arg, then After is the index into
-- Arg which is the first character after Expected. Otherwise, consider
-- the option to be invalid
begin
After := Arg_S'First + Expected'Length;
if Arg_S'Length <= Expected'Length
-- This procuedure is only used for cases where an option has varients,
-- such as -optimize-1 vs -optimize-2, so it must at least be longer
-- than the expected
or else Arg_S(Arg_S'First .. After - 1) /= Expected
then
Unrecognized_Option;
end if;
end Check_Option_Start;
begin
Build.Load_Last_Build_Config (Parameters.Build_Config);
-- Load last configuration (if available)
-- Collect the command, if any
if Arg_Count = 0 then
-- Use the default command
return;
end if;
if not Is_Option (Argument(1)) then
declare
package ACH renames Ada.Characters.Handling;
Command_Text: constant String := ACH.To_Lower (Argument (1));
Bad_Command : Boolean := True;
procedure Check_Command (Expected: in Selected_Command;
Check : in String)
is begin
if Command_Text = Check then
Command := Expected;
Bad_Command := False;
else
Bad_Command := True;
end if;
end;
begin
if Command_Text'Length < 2 then
Bad_Command := True;
else
case Command_Text(Command_Text'First) is
when 'b' => Check_Command (Build_Command, "build" );
when 'c' =>
case Command_Text(Command_Text'First + 1) is
when 'h' => Check_Command (Checkout_Command, "checkout" );
when 'l' => Check_Command (Clean_Command, "clean" );
when 'o' => Check_Command (Compile_Command, "compile" );
when others => Bad_Command := True;
end case;
when 'h' => Check_Command (Help_Command, "help" );
when 'l' => Check_Command (Library_Command, "library" );
when 'r' => Check_Command (Run_Command, "run" );
when 's' => Check_Command (Systemize_Command, "systemize");
when others => Bad_Command := True;
end case;
end if;
if Bad_Command then
UI.Put_Fail_Tag;
Put_Line (" Command """ & Command_Text & """ not recognized.");
Command := Help_Command;
return;
end if;
end;
Options_Start := 2;
else
Options_Start := 1;
end if;
-- Capture the "main unit" if it is defined (only for the relevant commands)
if Command in Build_Command | Run_Command
and then Options_Start <= Arg_Count
and then not Is_Option (Argument(Options_Start))
then
-- We have to assume that this unit name is utf-8 encoded
declare
package UTF renames Ada.Strings.UTF_Encoding;
package WWUTF renames UTF.Wide_Wide_Strings;
WWName: constant Wide_Wide_String
:= WWUTF.Decode (UTF.UTF_8_String'(Argument(Options_Start)));
begin
if Unit_Names.Valid_Unit_Name (WWName) then
Parameters.Main_Unit := Unit_Names.Set_Name (WWName);
Options_Start := Options_Start + 1;
if Parameters.Main_Unit.Is_External_Unit then
UI.Put_Fail_Tag;
Put_Line (" External main units are not supported.");
raise Process_Failed;
end if;
else
UI.Put_Fail_Tag;
Put_Line (" Main Unit Name """ & Argument (Options_Start)
& """ is not a valid Ada unit name.");
raise Process_Failed;
end if;
end;
end if;
-- Process all options, and check against the command
Parameters.Last_Argument := Options_Start;
Option_Iteration:
for I in Options_Start .. Arg_Count loop
Set_Unbounded_String
(Target => Arg,
Source => Ada.Characters.Handling.To_Lower (Argument (I)));
if Element (Arg, 1) /= '-' then
-- End of the options
Parameters.Last_Argument := I - 1;
exit;
end if;
case Element (Arg, 2) is
when 'a' =>
if To_String (Arg) = "-assertions" then
Parameters.Build_Config.All_Assertions := True;
else
Unrecognized_Option;
return;
end if;
when 'd' =>
if To_String (Arg) = "-debug" then
Parameters.Build_Config.Debug_Enabled := True;
else
Unrecognized_Option;
return;
end if;
when 'n' =>
-- Must be -no-pie or -no-pic
if Arg = "-no-pic" or else Arg = "-no-pie"
then
Parameters.Build_Config.Position_Independent := False;
else
Unrecognized_Option;
return;
end if;
when 'o' =>
-- Optimize of some kind
declare
Arg_S: constant String := To_String (Arg);
Diff_Start: Positive;
begin
Check_Option_Start (Arg_S => Arg_S,
Expected => "-optimize-",
After => Diff_Start);
case Arg_S (Diff_Start) is
when '1' => Parameters.Build_Config.Optimization := Level_1;
when '2' => Parameters.Build_Config.Optimization := Level_2;
when '3' => Parameters.Build_Config.Optimization := Level_3;
when 's' => Parameters.Build_Config.Optimization := Size;
when 'd' => Parameters.Build_Config.Optimization := Debug;
when others =>
Unrecognized_Option;
return;
end case;
end;
when 'q' =>
if Arg = "-q" then
Parameters.Output_Style := Quiet;
else
Unrecognized_Option;
return;
end if;
when 'r' =>
declare
Arg_S: constant String := To_String (Arg);
Diff_Start: Positive;
begin
Check_Option_Start (Arg_S => Arg_S,
Expected => "-repo-",
After => Diff_Start);
case Arg_S (Diff_Start) is
when 'a' => Parameters.Systemize_Mode := Add;
when 's' => Parameters.Systemize_Mode := Show;
when others =>
Unrecognized_Option;
return;
end case;
end;
when 's' =>
if Arg = "-static" then
Parameters.Build_Config.Linking := Static;
Parameters.Build_Config.Position_Independent := False;
elsif Arg = "-static-rt" then
Parameters.Build_Config.Linking := Static_RT;
else
Unrecognized_Option;
return;
end if;
when 'v' =>
if Arg = "-v" then
Parameters.Output_Style := Verbose;
else
Unrecognized_Option;
return;
end if;
when 'y' =>
if Arg = "-y" then
UI_Primitives.Auto_Queries := True;
else
Unrecognized_Option;
return;
end if;
when others =>
Unrecognized_Option;
return;
end case;
end loop Option_Iteration;
-- Check library name validity, and determine if it is a static (archive) or
-- dynamic library. We can also alert the user of an override of -static if
-- the library is to be an archive.
--
-- After this, the actual Link_Or_Archive phase can be confident the library
-- name is valid and appropriate for the platform and configuration
if Command = Library_Command then
if Parameters.Last_Argument = Arg_Count then
UI.Put_Fail_Tag;
Put_Line (" Library builds must include a target library output "
& "filename.");
raise Process_Failed;
end if;
-- Extract the extension slice of the expected file name
declare
Output_Name: constant String
:= Argument(Parameters.Last_Argument + 1);
Extension: constant String
:= Ada.Characters.Handling.To_Lower
(Ada.Directories.Extension
(Argument(Parameters.Last_Argument + 1)));
begin
if Extension = "a" then
if Parameters.Build_Config.Linking /= Static then
UI.Put_Info_Tag;
Put_Line (" Archive libraries (.a) imply -static.");
Parameters.Build_Config.Linking := Static;
end if;
elsif Extension = "so" then
if Platform_Info.Platform_Family = "windows" then
UI.Put_Fail_Tag;
Put_Line (" Windows only supports .a and .dll libraries.");
raise Process_Failed;
elsif Platform_Info.Platform_Family = "unix"
and then Platform_Info.Platform_Flavor = "darwin"
then
UI.Put_Fail_Tag;
Put_Line (" Darwin only supports .a and .dylib "
& "libraries.");
raise Process_Failed;
end if;
elsif Extension = "dylib" then
if Platform_Info.Platform_Family /= "unix"
or else Platform_Info.Platform_Flavor /= "darwin"
then
UI.Put_Fail_Tag;
Put_Line (" .dylib libraries are only supported for Darwin "
& "targets.");
raise Process_Failed;
end if;
elsif Extension = "dll" then
if Platform_Info.Platform_Family /= "windows" then
UI.Put_Fail_Tag;
Put_Line (" .dll libraries are only supported for Windows "
& "targets.");
raise Process_Failed;
end if;
else
UI.Put_Fail_Tag;
Put_Line (" Library name must end in a valid extension "
& "(.a/.so/.dylib/.dll)");
raise Process_Failed;
end if;
end;
end if;
-- Systemize is tightly controlled by AURA, so we need to warn the user
-- when they attempt to use invalid options
if Command = Systemize_Command
and then (not Parameters.Build_Config.Position_Independent
or else Parameters.Build_Config.Linking /= Shared)
then
UI.Put_Warn_Tag;
Put_Line (" -no-pie/-no-pic and -static/-static-rt are not relevant when");
Put_Line (" building a System repository.");
Parameters.Build_Config.Position_Independent := True;
Parameters.Build_Config.Linking := Shared;
raise Process_Failed;
end if;
-- Finally set the Build mode
case Command is
when Build_Command | Run_Command =>
Parameters.Build_Config.Mode := Image;
when Library_Command =>
Parameters.Build_Config.Mode := Library;
when Systemize_Command =>
Parameters.Build_Config.Mode := Systemize;
when Checkout_Command | Clean_Command | Compile_Command | Help_Command =>
-- We simply set an arbitrary default in this case, as the build mode
-- won't actually matter in these cases
Parameters.Build_Config.Mode := Image;
end case;
end Initialize_Parameters;
| 38.091518 | 81 | 0.492236 |
4bb6026c3f3fbf8fa5bb55487292708075280cc6 | 17,205 | adb | Ada | src/sys/serialize/util-serialize-io-csv.adb | yrashk/ada-util | 2aaa1d87e92a7137e1c63dce90f0722c549dfafd | [
"Apache-2.0"
] | null | null | null | src/sys/serialize/util-serialize-io-csv.adb | yrashk/ada-util | 2aaa1d87e92a7137e1c63dce90f0722c549dfafd | [
"Apache-2.0"
] | null | null | null | src/sys/serialize/util-serialize-io-csv.adb | yrashk/ada-util | 2aaa1d87e92a7137e1c63dce90f0722c549dfafd | [
"Apache-2.0"
] | null | null | null | -----------------------------------------------------------------------
-- util-serialize-io-csv -- CSV Serialization Driver
-- Copyright (C) 2011, 2015, 2016, 2017 Stephane Carrez
-- Written by Stephane Carrez ([email protected])
--
-- Licensed under the Apache License, Version 2.0 (the "License");
-- you may not use this file except in compliance with the License.
-- You may obtain a copy of the License at
--
-- http://www.apache.org/licenses/LICENSE-2.0
--
-- Unless required by applicable law or agreed to in writing, software
-- distributed under the License is distributed on an "AS IS" BASIS,
-- WITHOUT WARRANTIES OR CONDITIONS OF ANY KIND, either express or implied.
-- See the License for the specific language governing permissions and
-- limitations under the License.
-----------------------------------------------------------------------
with Ada.Strings.Unbounded;
with Ada.Characters.Latin_1;
with Ada.IO_Exceptions;
with Util.Strings;
with Util.Dates.ISO8601;
package body Util.Serialize.IO.CSV is
-- ------------------------------
-- Set the field separator. The default field separator is the comma (',').
-- ------------------------------
procedure Set_Field_Separator (Stream : in out Output_Stream;
Separator : in Character) is
begin
Stream.Separator := Separator;
end Set_Field_Separator;
-- ------------------------------
-- Enable or disable the double quotes by default for strings.
-- ------------------------------
procedure Set_Quotes (Stream : in out Output_Stream;
Enable : in Boolean) is
begin
Stream.Quote := Enable;
end Set_Quotes;
-- ------------------------------
-- Write the value as a CSV cell. Special characters are escaped using the CSV
-- escape rules.
-- ------------------------------
procedure Write_Cell (Stream : in out Output_Stream;
Value : in String) is
begin
if Stream.Column > 1 then
Stream.Write (Stream.Separator);
end if;
Stream.Column := Stream.Column + 1;
if Stream.Quote then
Stream.Write ('"');
end if;
for I in Value'Range loop
if Value (I) = '"' then
Stream.Write ("""""");
else
Stream.Write (Value (I));
end if;
end loop;
if Stream.Quote then
Stream.Write ('"');
end if;
end Write_Cell;
procedure Write_Cell (Stream : in out Output_Stream;
Value : in Integer) is
begin
if Stream.Column > 1 then
Stream.Write (Stream.Separator);
end if;
Stream.Column := Stream.Column + 1;
Stream.Write (Util.Strings.Image (Value));
end Write_Cell;
procedure Write_Cell (Stream : in out Output_Stream;
Value : in Boolean) is
begin
if Stream.Column > 1 then
Stream.Write (Stream.Separator);
end if;
Stream.Column := Stream.Column + 1;
if Value then
Stream.Write ("true");
else
Stream.Write ("false");
end if;
end Write_Cell;
procedure Write_Cell (Stream : in out Output_Stream;
Value : in Util.Beans.Objects.Object) is
use Util.Beans.Objects;
begin
case Util.Beans.Objects.Get_Type (Value) is
when TYPE_NULL =>
if Stream.Column > 1 then
Stream.Write (Stream.Separator);
end if;
Stream.Column := Stream.Column + 1;
if Stream.Quote then
Stream.Write ("""null""");
else
Stream.Write ("null");
end if;
when TYPE_BOOLEAN =>
if Stream.Column > 1 then
Stream.Write (Stream.Separator);
end if;
Stream.Column := Stream.Column + 1;
if Util.Beans.Objects.To_Boolean (Value) then
Stream.Write ("true");
else
Stream.Write ("false");
end if;
when TYPE_INTEGER =>
if Stream.Column > 1 then
Stream.Write (Stream.Separator);
end if;
Stream.Column := Stream.Column + 1;
-- Stream.Write ('"');
Stream.Write (Util.Beans.Objects.To_Long_Long_Integer (Value));
-- Stream.Write ('"');
when others =>
Stream.Write_Cell (Util.Beans.Objects.To_String (Value));
end case;
end Write_Cell;
-- ------------------------------
-- Start a new row.
-- ------------------------------
procedure New_Row (Stream : in out Output_Stream) is
begin
while Stream.Column < Stream.Max_Columns loop
Stream.Write (Stream.Separator);
Stream.Column := Stream.Column + 1;
end loop;
Stream.Write (ASCII.CR);
Stream.Write (ASCII.LF);
Stream.Column := 1;
Stream.Row := Stream.Row + 1;
end New_Row;
-- -----------------------
-- Write the attribute name/value pair.
-- -----------------------
overriding
procedure Write_Attribute (Stream : in out Output_Stream;
Name : in String;
Value : in String) is
pragma Unreferenced (Name);
begin
Stream.Write_Cell (Value);
end Write_Attribute;
overriding
procedure Write_Wide_Attribute (Stream : in out Output_Stream;
Name : in String;
Value : in Wide_Wide_String) is
begin
null;
end Write_Wide_Attribute;
overriding
procedure Write_Attribute (Stream : in out Output_Stream;
Name : in String;
Value : in Integer) is
pragma Unreferenced (Name);
begin
Stream.Write_Cell (Value);
end Write_Attribute;
overriding
procedure Write_Attribute (Stream : in out Output_Stream;
Name : in String;
Value : in Boolean) is
pragma Unreferenced (Name);
begin
Stream.Write_Cell (Value);
end Write_Attribute;
overriding
procedure Write_Attribute (Stream : in out Output_Stream;
Name : in String;
Value : in Util.Beans.Objects.Object) is
pragma Unreferenced (Name);
begin
Stream.Write_Cell (Value);
end Write_Attribute;
procedure Write_Entity (Stream : in out Output_Stream;
Name : in String;
Value : in Util.Beans.Objects.Object) is
pragma Unreferenced (Name);
begin
Stream.Write_Cell (Value);
end Write_Entity;
-- -----------------------
-- Write the entity value.
-- -----------------------
overriding
procedure Write_Entity (Stream : in out Output_Stream;
Name : in String;
Value : in String) is
pragma Unreferenced (Name);
begin
Stream.Write_Cell (Value);
end Write_Entity;
overriding
procedure Write_Wide_Entity (Stream : in out Output_Stream;
Name : in String;
Value : in Wide_Wide_String) is
begin
null;
end Write_Wide_Entity;
overriding
procedure Write_Entity (Stream : in out Output_Stream;
Name : in String;
Value : in Boolean) is
pragma Unreferenced (Name);
begin
Stream.Write_Cell (Value);
end Write_Entity;
overriding
procedure Write_Entity (Stream : in out Output_Stream;
Name : in String;
Value : in Integer) is
pragma Unreferenced (Name);
begin
Stream.Write_Cell (Value);
end Write_Entity;
overriding
procedure Write_Entity (Stream : in out Output_Stream;
Name : in String;
Value : in Ada.Calendar.Time) is
begin
Stream.Write_Entity (Name, Util.Dates.ISO8601.Image (Value, Util.Dates.ISO8601.SUBSECOND));
end Write_Entity;
overriding
procedure Write_Long_Entity (Stream : in out Output_Stream;
Name : in String;
Value : in Long_Long_Integer) is
begin
null;
end Write_Long_Entity;
overriding
procedure Write_Enum_Entity (Stream : in out Output_Stream;
Name : in String;
Value : in String) is
begin
Stream.Write_Entity (Name, Value);
end Write_Enum_Entity;
-- ------------------------------
-- Write the attribute with a null value.
-- ------------------------------
overriding
procedure Write_Null_Attribute (Stream : in out Output_Stream;
Name : in String) is
begin
Stream.Write_Entity (Name, "");
end Write_Null_Attribute;
-- ------------------------------
-- Write an entity with a null value.
-- ------------------------------
procedure Write_Null_Entity (Stream : in out Output_Stream;
Name : in String) is
begin
Stream.Write_Null_Attribute (Name);
end Write_Null_Entity;
-- ------------------------------
-- Get the header name for the given column.
-- If there was no header line, build a default header for the column.
-- ------------------------------
function Get_Header_Name (Handler : in Parser;
Column : in Column_Type) return String is
use type Ada.Containers.Count_Type;
Default_Header : constant String := "ABCDEFGHIJKLMNOPQRSTUVWXYZ";
Result : String (1 .. 10);
N, R : Natural;
Pos : Positive := Result'Last;
begin
if Handler.Headers.Length >= Ada.Containers.Count_Type (Column) then
return Handler.Headers.Element (Positive (Column));
end if;
N := Natural (Column - 1);
loop
R := N mod 26;
N := N / 26;
Result (Pos) := Default_Header (R + 1);
exit when N = 0;
Pos := Pos - 1;
end loop;
return Result (Pos .. Result'Last);
end Get_Header_Name;
-- ------------------------------
-- Set the cell value at the given row and column.
-- The default implementation finds the column header name and
-- invokes <b>Write_Entity</b> with the header name and the value.
-- ------------------------------
procedure Set_Cell (Handler : in out Parser;
Value : in String;
Row : in Row_Type;
Column : in Column_Type) is
use Ada.Containers;
begin
if Row = 0 then
-- Build the headers table.
declare
Missing : constant Integer := Integer (Column) - Integer (Handler.Headers.Length);
begin
if Missing > 0 then
Handler.Headers.Set_Length (Handler.Headers.Length + Count_Type (Missing));
end if;
Handler.Headers.Replace_Element (Positive (Column), Value);
end;
else
declare
Name : constant String := Handler.Get_Header_Name (Column);
begin
-- Detect a new row. Close the current object and start a new one.
if Handler.Row /= Row then
if Row > 1 then
Handler.Sink.Finish_Object ("", Handler);
else
Handler.Sink.Start_Array ("", Handler);
end if;
Handler.Sink.Start_Object ("", Handler);
end if;
Handler.Row := Row;
Handler.Sink.Set_Member (Name, Util.Beans.Objects.To_Object (Value), Handler);
end;
end if;
end Set_Cell;
-- ------------------------------
-- Set the field separator. The default field separator is the comma (',').
-- ------------------------------
procedure Set_Field_Separator (Handler : in out Parser;
Separator : in Character) is
begin
Handler.Separator := Separator;
end Set_Field_Separator;
-- ------------------------------
-- Get the field separator.
-- ------------------------------
function Get_Field_Separator (Handler : in Parser) return Character is
begin
return Handler.Separator;
end Get_Field_Separator;
-- ------------------------------
-- Set the comment separator. When a comment separator is defined, a line which starts
-- with the comment separator will be ignored. The row number will not be incremented.
-- ------------------------------
procedure Set_Comment_Separator (Handler : in out Parser;
Separator : in Character) is
begin
Handler.Comment := Separator;
end Set_Comment_Separator;
-- ------------------------------
-- Get the comment separator. Returns ASCII.NUL if comments are not supported.
-- ------------------------------
function Get_Comment_Separator (Handler : in Parser) return Character is
begin
return Handler.Comment;
end Get_Comment_Separator;
-- ------------------------------
-- Setup the CSV parser and mapper to use the default column header names.
-- When activated, the first row is assumed to contain the first item to de-serialize.
-- ------------------------------
procedure Set_Default_Headers (Handler : in out Parser;
Mode : in Boolean := True) is
begin
Handler.Use_Default_Headers := Mode;
end Set_Default_Headers;
-- ------------------------------
-- Parse the stream using the CSV parser.
-- Call <b>Set_Cell</b> for each cell that has been parsed indicating the row and
-- column numbers as well as the cell value.
-- ------------------------------
overriding
procedure Parse (Handler : in out Parser;
Stream : in out Util.Streams.Buffered.Input_Buffer_Stream'Class;
Sink : in out Reader'Class) is
use Ada.Strings.Unbounded;
C : Character;
Token : Unbounded_String;
Column : Column_Type := 1;
Row : Row_Type := 0;
In_Quote_Token : Boolean := False;
In_Escape : Boolean := False;
Ignore_Row : Boolean := False;
begin
if Handler.Use_Default_Headers then
Row := 1;
end if;
Handler.Headers.Clear;
Handler.Sink := Sink'Unchecked_Access;
loop
Stream.Read (Char => C);
if C = Ada.Characters.Latin_1.CR or C = Ada.Characters.Latin_1.LF then
if C = Ada.Characters.Latin_1.LF then
Handler.Line_Number := Handler.Line_Number + 1;
end if;
if not Ignore_Row then
if In_Quote_Token and not In_Escape then
Append (Token, C);
elsif Column > 1 or else Length (Token) > 0 then
Parser'Class (Handler).Set_Cell (To_String (Token), Row, Column);
Set_Unbounded_String (Token, "");
Row := Row + 1;
Column := 1;
In_Quote_Token := False;
In_Escape := False;
end if;
else
Ignore_Row := False;
end if;
elsif C = Handler.Separator and not Ignore_Row then
if In_Quote_Token and not In_Escape then
Append (Token, C);
else
Parser'Class (Handler).Set_Cell (To_String (Token), Row, Column);
Set_Unbounded_String (Token, "");
Column := Column + 1;
In_Quote_Token := False;
In_Escape := False;
end if;
elsif C = '"' and not Ignore_Row then
if In_Quote_Token then
In_Escape := True;
elsif In_Escape then
Append (Token, C);
In_Escape := False;
elsif Ada.Strings.Unbounded.Length (Token) = 0 then
In_Quote_Token := True;
else
Append (Token, C);
end if;
elsif C = Handler.Comment and Handler.Comment /= ASCII.NUL
and Column = 1 and Length (Token) = 0
then
Ignore_Row := True;
elsif not Ignore_Row then
Append (Token, C);
In_Escape := False;
end if;
end loop;
exception
when Ada.IO_Exceptions.Data_Error =>
Parser'Class (Handler).Set_Cell (To_String (Token), Row, Column);
Handler.Sink := null;
return;
end Parse;
-- ------------------------------
-- Get the current location (file and line) to report an error message.
-- ------------------------------
overriding
function Get_Location (Handler : in Parser) return String is
begin
return Util.Strings.Image (Handler.Line_Number);
end Get_Location;
end Util.Serialize.IO.CSV;
| 34.136905 | 97 | 0.522464 |
9aa3635f850cd56cff3c690444d17672a0ebc654 | 1,687 | ads | Ada | source/oasis/program-subunits.ads | reznikmm/gela | 20134f1d154fb763812e73860c6f4b04f353df79 | [
"MIT"
] | null | null | null | source/oasis/program-subunits.ads | reznikmm/gela | 20134f1d154fb763812e73860c6f4b04f353df79 | [
"MIT"
] | null | null | null | source/oasis/program-subunits.ads | reznikmm/gela | 20134f1d154fb763812e73860c6f4b04f353df79 | [
"MIT"
] | 1 | 2019-10-16T09:05:27.000Z | 2019-10-16T09:05:27.000Z | -- SPDX-FileCopyrightText: 2019 Max Reznik <[email protected]>
--
-- SPDX-License-Identifier: MIT
-------------------------------------------------------------
with Program.Compilation_Units;
with Program.Compilation_Unit_Vectors;
package Program.Subunits is
pragma Pure;
type Subunit is limited interface
and Program.Compilation_Units.Compilation_Unit;
-- Subunits are like child units, with these (important) differences:
-- subunits support the separate compilation of bodies only (not
-- declarations); the parent contains a body_stub to indicate the existence
-- and place of each of its subunits; declarations appearing in the
-- parent's body can be visible within the subunits
type Subunit_Access is access all Subunit'Class
with Storage_Size => 0;
not overriding function Subunits (Self : access Subunit)
return Program.Compilation_Unit_Vectors.Compilation_Unit_Vector_Access
is abstract;
-- with Post'Class =>
-- (Subunits'Result.Is_Empty
-- or else (for all X in Subunits'Result.Each_Unit => X.Unit.Is_Subunit));
-- Returns a complete list of subunit values, with one value for each body
-- stub that appears in the given Subunit. Returns an empty list if the
-- parent unit does not contain any body stubs.
not overriding function Parent_Body (Self : access Subunit)
return not null Program.Compilation_Units.Compilation_Unit_Access
is abstract
with Post'Class =>
(Parent_Body'Result.Is_Subunit
or Parent_Body'Result.Is_Library_Unit_Body);
-- Returns the Compilation_Unit containing the body stub of the given
-- Subunit.
end Program.Subunits;
| 39.232558 | 79 | 0.711915 |
9adba12d676193d80a3789580bf8aee1d4b8fbcd | 1,357 | ads | Ada | src/planet.ads | drm343/Space-War-3000 | 6f51575021c1a8b42cc86456a7993884a25aa4b2 | [
"MIT"
] | 2 | 2017-10-07T06:24:31.000Z | 2020-05-16T21:55:20.000Z | src/planet.ads | drm343/Space-War-3000 | 6f51575021c1a8b42cc86456a7993884a25aa4b2 | [
"MIT"
] | null | null | null | src/planet.ads | drm343/Space-War-3000 | 6f51575021c1a8b42cc86456a7993884a25aa4b2 | [
"MIT"
] | null | null | null | with Ada.Containers.Vectors;
with Ada.Strings.Unbounded;
with Rule; use Rule;
package Planet is
package SU renames Ada.Strings.Unbounded;
package Origin_Define is
type Object is tagged private;
function Build (name : String;
colony : Integer;
starship : Integer;
station : Integer)
return Object;
function "=" (Left, Right : Object) return Boolean;
function show (planet: in Object) return String;
procedure attack (planet: in out Object);
private
type Object is tagged
record
Name : SU.Unbounded_String;
Damage: Boolean;
Colony: Integer;
Starship: Integer;
Station: Integer;
end record;
end Origin_Define;
subtype Object is Origin_Define.Object;
function Build (name : String;
colony : Integer;
starship : Integer;
station : Integer)
return Object
renames Origin_Define.Build;
subtype Planet_Range is Positive range 1 .. 10;
package Vectors is new Ada.Containers.Vectors
(Element_Type => Origin_Define.Object,
Index_Type => Planet_Range,
"=" => Origin_Define."=");
subtype Vector is Vectors.Vector;
end Planet;
| 27.693878 | 57 | 0.582167 |
1daf36b6e8fb4ef39a55a545c0f8e8390d5bb481 | 11,425 | adb | Ada | bb-runtimes/runtimes/zfp-stm32f3x4/gnat/s-secsta.adb | JCGobbi/Nucleo-STM32F334R8 | 2a0b1b4b2664c92773703ac5e95dcb71979d051c | [
"BSD-3-Clause"
] | null | null | null | bb-runtimes/runtimes/zfp-stm32f3x4/gnat/s-secsta.adb | JCGobbi/Nucleo-STM32F334R8 | 2a0b1b4b2664c92773703ac5e95dcb71979d051c | [
"BSD-3-Clause"
] | null | null | null | bb-runtimes/runtimes/zfp-stm32f3x4/gnat/s-secsta.adb | JCGobbi/Nucleo-STM32F334R8 | 2a0b1b4b2664c92773703ac5e95dcb71979d051c | [
"BSD-3-Clause"
] | null | null | null | ------------------------------------------------------------------------------
-- --
-- GNAT COMPILER COMPONENTS --
-- --
-- S Y S T E M . S E C O N D A R Y _ S T A C K --
-- --
-- B o d y --
-- --
-- Copyright (C) 1992-2021, Free Software Foundation, Inc. --
-- --
-- GNAT is free software; you can redistribute it and/or modify it under --
-- terms of the GNU General Public License as published by the Free Soft- --
-- ware Foundation; either version 3, or (at your option) any later ver- --
-- sion. GNAT is distributed in the hope that it will be useful, but WITH- --
-- OUT ANY WARRANTY; without even the implied warranty of MERCHANTABILITY --
-- or FITNESS FOR A PARTICULAR PURPOSE. --
-- --
-- --
-- --
-- --
-- --
-- You should have received a copy of the GNU General Public License and --
-- a copy of the GCC Runtime Library Exception along with this program; --
-- see the files COPYING3 and COPYING.RUNTIME respectively. If not, see --
-- <http://www.gnu.org/licenses/>. --
-- --
-- GNAT was originally developed by the GNAT team at New York University. --
-- Extensive contributions were provided by Ada Core Technologies Inc. --
-- --
------------------------------------------------------------------------------
-- This is the HI-E version of this package
with Ada.Unchecked_Conversion;
package body System.Secondary_Stack is
use type System.Parameters.Size_Type;
function Get_Sec_Stack return SS_Stack_Ptr;
pragma Import (C, Get_Sec_Stack, "__gnat_get_secondary_stack");
-- Return the pointer to the secondary stack of the current task.
--
-- The package imports this function to permit flexibility in the storage
-- of secondary stacks pointers to support a range of different ZFP and
-- other restricted run-time scenarios without needing to recompile the
-- run-time. A ZFP run-time will typically include a default implementation
-- suitable for single thread applications (s-sssita.adb). However, users
-- can replace this implementation by providing their own as part of their
-- program (for example, if multiple threads need to be supported in a ZFP
-- application).
--
-- Many Ravenscar run-times also use this mechanism to provide switch
-- between efficient single task and multitask implementations without
-- depending on System.Soft_Links.
--
-- In all cases, the binder will generate a default-sized secondary stack
-- for the environment task if the secondary stack is used by the program
-- being binded.
--
-- To support multithreaded ZFP-based applications, the binder supports
-- the creation of additional secondary stacks using the -Qnnn binder
-- switch. For the user to make use of these generated stacks, all threads
-- need to call SS_Init with a null-object parameter to be assigned a
-- stack. It is then the responsibility of the user to store the returned
-- pointer in a way that can be can retrieved via the user implementation
-- of the __gnat_get_secondary_stack function. In this scenario it is
-- recommended to use thread local variables. For example, if the
-- Thread_Local_Storage aspect is supported on the target:
--
-- pragma Warnings (Off);
-- with System.Secondary_Stack; use System.Secondary_Stack;
-- pragma Warnings (On);
--
-- package Secondary_Stack is
-- Thread_Sec_Stack : System.Secondary_Stack.SS_Stack_Ptr := null
-- with Thread_Local_Storage;
--
-- function Get_Sec_Stack return SS_Stack_Ptr
-- with Export, Convention => C,
-- External_Name => "__gnat_get_secondary_stack";
--
-- function Get_Sec_Stack return SS_Stack_Ptr is
-- begin
-- if Thread_Sec_Stack = null then
-- SS_Init (Thread_Sec_Stack);
-- end if;
--
-- return Thread_Sec_Stack;
-- end Get_Sec_Stack;
-- end Secondary_Stack;
-----------------
-- SS_Allocate --
-----------------
procedure SS_Allocate
(Addr : out Address;
Storage_Size : SSE.Storage_Count)
is
use type System.Storage_Elements.Storage_Count;
Max_Align : constant SS_Ptr := SS_Ptr (Standard'Maximum_Alignment);
Mem_Request : SS_Ptr;
Stack : constant SS_Stack_Ptr := Get_Sec_Stack;
begin
-- Round up Storage_Size to the nearest multiple of the max alignment
-- value for the target. This ensures efficient stack access. First
-- perform a check to ensure that the rounding operation does not
-- overflow SS_Ptr.
if SSE.Storage_Count (SS_Ptr'Last) - Standard'Maximum_Alignment <
Storage_Size
then
raise Storage_Error;
end if;
Mem_Request := ((SS_Ptr (Storage_Size) + Max_Align - 1) / Max_Align) *
Max_Align;
-- Check if max stack usage is increasing
if Stack.Max - Stack.Top - Mem_Request < 0 then
-- If so, check if the stack is exceeded, noting Stack.Top points to
-- the first free byte (so the value of Stack.Top on a fully
-- allocated stack will be Stack.Size + 1). The comparison is formed
-- to prevent integer overflows.
if Stack.Size - Stack.Top - Mem_Request < -1 then
raise Storage_Error;
end if;
-- Record new max usage
Stack.Max := Stack.Top + Mem_Request;
end if;
-- Set resulting address and update top of stack pointer
pragma Assert (Stack.Top <= Stack.Internal_Chunk'Last);
pragma Assert (Stack.Top >= Stack.Internal_Chunk'First);
-- Here, there is enough memory to get the whole requested memory
-- since the available memory was checked in the previous block.
Addr := Stack.Internal_Chunk (Stack.Top)'Address;
Stack.Top := Stack.Top + Mem_Request;
end SS_Allocate;
----------------
-- SS_Get_Max --
----------------
function SS_Get_Max return Long_Long_Integer is
begin
-- Stack.Max points to the first untouched byte in the stack, thus the
-- maximum number of bytes that have been allocated on the stack is one
-- less the value of Stack.Max.
return Long_Long_Integer (Get_Sec_Stack.Max - 1);
end SS_Get_Max;
-------------
-- SS_Init --
-------------
procedure SS_Init
(Stack : in out SS_Stack_Ptr;
Size : SP.Size_Type := SP.Unspecified_Size)
is
use Parameters;
begin
-- If the size of the secondary stack for a task has been specified via
-- the Secondary_Stack_Size aspect, then the compiler has allocated the
-- stack at compile time and the task create call will provide a pointer
-- to this stack. Otherwise, the task will be allocated a secondary
-- stack from the pool of default-sized secondary stacks created by the
-- binder.
if Stack = null then
-- Allocate a default-sized stack for the task.
if Size = Unspecified_Size
and then Binder_SS_Count > 0
and then Num_Of_Assigned_Stacks < Binder_SS_Count
then
-- The default-sized secondary stack pool is passed from the
-- binder to this package as an Address since it is not possible
-- to have a pointer to an array of unconstrained objects. A
-- pointer to the pool is obtainable via an unchecked conversion
-- to a constrained array of SS_Stacks that mirrors the one used
-- by the binder.
-- However, Ada understandably does not allow a local pointer to
-- a stack in the pool to be stored in a pointer outside of this
-- scope. While the conversion is safe in this case, since a view
-- of a global object is being used, using Unchecked_Access
-- would prevent users from specifying the restriction
-- No_Unchecked_Access whenever the secondary stack is used. As
-- a workaround, the local stack pointer is converted to a global
-- pointer via System.Address.
declare
type Stk_Pool_Array is array (1 .. Binder_SS_Count) of
aliased SS_Stack (Default_SS_Size);
type Stk_Pool_Access is access Stk_Pool_Array;
function To_Stack_Pool is new
Ada.Unchecked_Conversion (Address, Stk_Pool_Access);
pragma Warnings (Off);
function To_Global_Ptr is new
Ada.Unchecked_Conversion (Address, SS_Stack_Ptr);
pragma Warnings (On);
-- Suppress aliasing warning since the pointer we return will
-- be the only access to the stack.
Local_Stk_Address : System.Address;
begin
Num_Of_Assigned_Stacks := Num_Of_Assigned_Stacks + 1;
pragma Assert (Num_Of_Assigned_Stacks >= 1);
-- Num_Of_Assigned_Stacks is defined as Natural. So after, the
-- Previous increment it shall be greater or equal to 1.
Local_Stk_Address :=
To_Stack_Pool
(Default_Sized_SS_Pool) (Num_Of_Assigned_Stacks)'Address;
pragma Annotate (CodePeer, False_Positive, "array index check",
"Num_Of_Assigned_Stacks < Binder_SS_Count.");
Stack := To_Global_Ptr (Local_Stk_Address);
end;
-- Many run-times unconditionally bring in this package and call
-- SS_Init even though the secondary stack is not used by the
-- program. In this case return without assigning a stack as it will
-- never be used.
elsif Binder_SS_Count = 0 then
return;
else
raise Program_Error;
end if;
end if;
Stack.Top := 1;
Stack.Max := 1;
end SS_Init;
-------------
-- SS_Mark --
-------------
function SS_Mark return Mark_Id is
begin
return Mark_Id (Get_Sec_Stack.Top);
end SS_Mark;
----------------
-- SS_Release --
----------------
procedure SS_Release (M : Mark_Id) is
begin
Get_Sec_Stack.Top := SS_Ptr (M);
end SS_Release;
end System.Secondary_Stack;
| 42.314815 | 79 | 0.562713 |
38c6c64f53ee0e41fa13e91cb0953de28d283190 | 1,884 | adb | Ada | bb-runtimes/powerpc/gdbstub/stub.adb | JCGobbi/Nucleo-STM32F334R8 | 2a0b1b4b2664c92773703ac5e95dcb71979d051c | [
"BSD-3-Clause"
] | null | null | null | bb-runtimes/powerpc/gdbstub/stub.adb | JCGobbi/Nucleo-STM32F334R8 | 2a0b1b4b2664c92773703ac5e95dcb71979d051c | [
"BSD-3-Clause"
] | null | null | null | bb-runtimes/powerpc/gdbstub/stub.adb | JCGobbi/Nucleo-STM32F334R8 | 2a0b1b4b2664c92773703ac5e95dcb71979d051c | [
"BSD-3-Clause"
] | null | null | null | ------------------------------------------------------------------------------
-- --
-- Copyright (C) 2010, AdaCore --
-- --
-- GNARL is free software; you can redistribute it and/or modify it under --
-- terms of the GNU General Public License as published by the Free Soft- --
-- ware Foundation; either version 2, or (at your option) any later ver- --
-- sion. GNARL is distributed in the hope that it will be useful, but WITH- --
-- OUT ANY WARRANTY; without even the implied warranty of MERCHANTABILITY --
-- or FITNESS FOR A PARTICULAR PURPOSE. See the GNU General Public License --
-- for more details. You should have received a copy of the GNU General --
-- Public License distributed with GNARL; see file COPYING. If not, write --
-- to the Free Software Foundation, 59 Temple Place - Suite 330, Boston, --
-- MA 02111-1307, USA. --
-- --
-- As a special exception, if other files instantiate generics from this --
-- unit, or you link this unit with other files to produce an executable, --
-- this unit does not by itself cause the resulting executable to be --
-- covered by the GNU General Public License. This exception does not --
-- however invalidate any other reasons why the executable file might be --
-- covered by the GNU Public License. --
-- --
------------------------------------------------------------------------------
with Gdbstub;
procedure Stub is
begin
Gdbstub.Stub;
end Stub;
| 60.774194 | 78 | 0.478769 |
134f916e36842e8f2a1ddf07cf5e4aba933119e6 | 3,510 | ads | Ada | gcc-gcc-7_3_0-release/gcc/ada/s-imguns.ads | best08618/asylo | 5a520a9f5c461ede0f32acc284017b737a43898c | [
"Apache-2.0"
] | 7 | 2020-05-02T17:34:05.000Z | 2021-10-17T10:15:18.000Z | gcc-gcc-7_3_0-release/gcc/ada/s-imguns.ads | best08618/asylo | 5a520a9f5c461ede0f32acc284017b737a43898c | [
"Apache-2.0"
] | null | null | null | gcc-gcc-7_3_0-release/gcc/ada/s-imguns.ads | best08618/asylo | 5a520a9f5c461ede0f32acc284017b737a43898c | [
"Apache-2.0"
] | 2 | 2020-07-27T00:22:36.000Z | 2021-04-01T09:41:02.000Z | ------------------------------------------------------------------------------
-- --
-- GNAT RUN-TIME COMPONENTS --
-- --
-- S Y S T E M . I M G _ U N S --
-- --
-- S p e c --
-- --
-- Copyright (C) 1992-2014, Free Software Foundation, Inc. --
-- --
-- GNAT is free software; you can redistribute it and/or modify it under --
-- terms of the GNU General Public License as published by the Free Soft- --
-- ware Foundation; either version 3, or (at your option) any later ver- --
-- sion. GNAT is distributed in the hope that it will be useful, but WITH- --
-- OUT ANY WARRANTY; without even the implied warranty of MERCHANTABILITY --
-- or FITNESS FOR A PARTICULAR PURPOSE. --
-- --
-- As a special exception under Section 7 of GPL version 3, you are granted --
-- additional permissions described in the GCC Runtime Library Exception, --
-- version 3.1, as published by the Free Software Foundation. --
-- --
-- You should have received a copy of the GNU General Public License and --
-- a copy of the GCC Runtime Library Exception along with this program; --
-- see the files COPYING3 and COPYING.RUNTIME respectively. If not, see --
-- <http://www.gnu.org/licenses/>. --
-- --
-- GNAT was originally developed by the GNAT team at New York University. --
-- Extensive contributions were provided by Ada Core Technologies Inc. --
-- --
------------------------------------------------------------------------------
-- This package contains the routines for supporting the Image attribute for
-- modular integer types up to size Unsigned'Size, and also for conversion
-- operations required in Text_IO.Modular_IO for such types.
with System.Unsigned_Types;
package System.Img_Uns is
pragma Pure;
procedure Image_Unsigned
(V : System.Unsigned_Types.Unsigned;
S : in out String;
P : out Natural);
pragma Inline (Image_Unsigned);
-- Computes Unsigned'Image (V) and stores the result in S (1 .. P) setting
-- the resulting value of P. The caller guarantees that S is long enough to
-- hold the result, and that S'First is 1.
procedure Set_Image_Unsigned
(V : System.Unsigned_Types.Unsigned;
S : in out String;
P : in out Natural);
-- Stores the image of V in S starting at S (P + 1), P is updated to point
-- to the last character stored. The value stored is identical to the value
-- of Unsigned'Image (V) except that no leading space is stored. The caller
-- guarantees that S is long enough to hold the result. S need not have a
-- lower bound of 1.
end System.Img_Uns;
| 57.540984 | 79 | 0.473504 |
13fbffd2f1c073f84a18cbecffc64d8cef85e26c | 8,621 | adb | Ada | src/audio-wavefiles-generic_float_pcm_io.adb | Ada-Audio/wavefiles | 8e1162c5b9dc604a835f60be6a78e8f9d3c85052 | [
"MIT"
] | 10 | 2016-02-29T09:35:56.000Z | 2020-05-16T02:55:20.000Z | src/audio-wavefiles-generic_float_pcm_io.adb | gusthoff/wavefiles | 8e1162c5b9dc604a835f60be6a78e8f9d3c85052 | [
"MIT"
] | null | null | null | src/audio-wavefiles-generic_float_pcm_io.adb | gusthoff/wavefiles | 8e1162c5b9dc604a835f60be6a78e8f9d3c85052 | [
"MIT"
] | null | null | null | ------------------------------------------------------------------------------
-- --
-- THIS IS AN AUTOMATICALLY GENERATED FILE! DO NOT EDIT! --
-- --
-- WAVEFILES --
-- --
-- Wavefile I/O operations for PCM buffers --
-- --
-- The MIT License (MIT) --
-- --
-- Copyright (c) 2015 -- 2020 Gustavo A. Hoffmann --
-- --
-- Permission is hereby granted, free of charge, to any person obtaining --
-- a copy of this software and associated documentation files (the --
-- "Software"), to deal in the Software without restriction, including --
-- without limitation the rights to use, copy, modify, merge, publish, --
-- distribute, sublicense, and / or sell copies of the Software, and to --
-- permit persons to whom the Software is furnished to do so, subject to --
-- the following conditions: --
-- --
-- The above copyright notice and this permission notice shall be --
-- included in all copies or substantial portions of the Software. --
-- --
-- THE SOFTWARE IS PROVIDED "AS IS", WITHOUT WARRANTY OF ANY KIND, --
-- EXPRESS OR IMPLIED, INCLUDING BUT NOT LIMITED TO THE WARRANTIES OF --
-- MERCHANTABILITY, FITNESS FOR A PARTICULAR PURPOSE AND NONINFRINGEMENT. --
-- IN NO EVENT SHALL THE AUTHORS OR COPYRIGHT HOLDERS BE LIABLE FOR ANY --
-- CLAIM, DAMAGES OR OTHER LIABILITY, WHETHER IN AN ACTION OF CONTRACT, --
-- TORT OR OTHERWISE, ARISING FROM, OUT OF OR IN CONNECTION WITH THE --
-- SOFTWARE OR THE USE OR OTHER DEALINGS IN THE SOFTWARE. --
------------------------------------------------------------------------------
with Audio.Wavefiles.Data_Types; use Audio.Wavefiles.Data_Types;
with Audio.Wavefiles.Generic_Float_Wav_Float_PCM_IO;
with Audio.Wavefiles.Generic_Fixed_Wav_Float_PCM_IO;
package body Audio.Wavefiles.Generic_Float_PCM_IO is
package PCM_Fixed_Wav_16 is new
Audio.Wavefiles.Generic_Fixed_Wav_Float_PCM_IO
(Wav_Sample => Wav_Fixed_16,
PCM_Sample => PCM_Sample,
Channel_Range => Channel_Range,
PCM_MC_Sample => PCM_MC_Sample);
package PCM_Fixed_Wav_24 is new
Audio.Wavefiles.Generic_Fixed_Wav_Float_PCM_IO
(Wav_Sample => Wav_Fixed_24,
PCM_Sample => PCM_Sample,
Channel_Range => Channel_Range,
PCM_MC_Sample => PCM_MC_Sample);
package PCM_Fixed_Wav_32 is new
Audio.Wavefiles.Generic_Fixed_Wav_Float_PCM_IO
(Wav_Sample => Wav_Fixed_32,
PCM_Sample => PCM_Sample,
Channel_Range => Channel_Range,
PCM_MC_Sample => PCM_MC_Sample);
package PCM_Float_Wav_32 is new
Audio.Wavefiles.Generic_Float_Wav_Float_PCM_IO
(Wav_Sample => Wav_Float_32,
PCM_Sample => PCM_Sample,
Channel_Range => Channel_Range,
PCM_MC_Sample => PCM_MC_Sample);
package PCM_Float_Wav_64 is new
Audio.Wavefiles.Generic_Float_Wav_Float_PCM_IO
(Wav_Sample => Wav_Float_64,
PCM_Sample => PCM_Sample,
Channel_Range => Channel_Range,
PCM_MC_Sample => PCM_MC_Sample);
---------
-- Get --
---------
function Get
(WF : in out Wavefile) return PCM_MC_Sample
is
Dummy_MC_Sample :
PCM_MC_Sample (Channel_Range'Succ (Channel_Range'First) ..
Channel_Range'First);
begin
if not WF.Is_Opened then
WF.Set_Error (Wavefile_Error_File_Not_Open);
return Dummy_MC_Sample;
end if;
if not Is_Supported_Format (WF.Wave_Format) then
WF.Set_Error (Wavefile_Error_Unsupported_Wavefile_Format);
return Dummy_MC_Sample;
end if;
if WF.Wave_Format.Is_Float_Format then
case WF.Wave_Format.Bits_Per_Sample is
when Bit_Depth_8 | Bit_Depth_16 | Bit_Depth_24 =>
WF.Set_Error (Wavefile_Error_Unsupported_Bit_Depth);
return Dummy_MC_Sample;
when Bit_Depth_32 =>
return PCM_Float_Wav_32.Get (WF);
when Bit_Depth_64 =>
return PCM_Float_Wav_64.Get (WF);
end case;
else
-- Always assume fixed-point PCM format
case WF.Wave_Format.Bits_Per_Sample is
when Bit_Depth_8 =>
WF.Set_Error (Wavefile_Error_Unsupported_Bit_Depth);
return Dummy_MC_Sample;
when Bit_Depth_16 =>
return PCM_Fixed_Wav_16.Get (WF);
when Bit_Depth_24 =>
return PCM_Fixed_Wav_24.Get (WF);
when Bit_Depth_32 =>
return PCM_Fixed_Wav_32.Get (WF);
when Bit_Depth_64 =>
WF.Set_Error (Wavefile_Error_Unsupported_Bit_Depth);
return Dummy_MC_Sample;
end case;
end if;
end Get;
---------
-- Get --
---------
procedure Get
(WF : in out Wavefile;
PCM : out PCM_MC_Sample) is
begin
if not WF.Is_Opened then
WF.Set_Error (Wavefile_Error_File_Not_Open);
PCM := (others => 0.0);
end if;
if not Is_Supported_Format (WF.Wave_Format) then
WF.Set_Error (Wavefile_Error_Unsupported_Wavefile_Format);
PCM := (others => 0.0);
end if;
if WF.Wave_Format.Is_Float_Format then
case WF.Wave_Format.Bits_Per_Sample is
when Bit_Depth_8 | Bit_Depth_16 | Bit_Depth_24 =>
WF.Set_Error (Wavefile_Error_Unsupported_Bit_Depth);
PCM := (others => 0.0);
when Bit_Depth_32 =>
PCM_Float_Wav_32.Get (WF, PCM);
when Bit_Depth_64 =>
PCM_Float_Wav_64.Get (WF, PCM);
end case;
else
-- Always assume fixed-point PCM format
case WF.Wave_Format.Bits_Per_Sample is
when Bit_Depth_8 =>
WF.Set_Error (Wavefile_Error_Unsupported_Bit_Depth);
PCM := (others => 0.0);
when Bit_Depth_16 =>
PCM_Fixed_Wav_16.Get (WF, PCM);
when Bit_Depth_24 =>
PCM_Fixed_Wav_24.Get (WF, PCM);
when Bit_Depth_32 =>
PCM_Fixed_Wav_32.Get (WF, PCM);
when Bit_Depth_64 =>
WF.Set_Error (Wavefile_Error_Unsupported_Bit_Depth);
PCM := (others => 0.0);
end case;
end if;
end Get;
---------
-- Put --
---------
procedure Put
(WF : in out Wavefile;
PCM : PCM_MC_Sample) is
begin
if not WF.Is_Opened then
WF.Set_Error (Wavefile_Error_File_Not_Open);
return;
end if;
if not Is_Supported_Format (WF.Wave_Format) then
WF.Set_Error (Wavefile_Error_Unsupported_Wavefile_Format);
return;
end if;
if WF.Wave_Format.Is_Float_Format then
case WF.Wave_Format.Bits_Per_Sample is
when Bit_Depth_8 | Bit_Depth_16 | Bit_Depth_24 =>
WF.Set_Error (Wavefile_Error_Unsupported_Bit_Depth);
return;
when Bit_Depth_32 =>
PCM_Float_Wav_32.Put (WF, PCM);
when Bit_Depth_64 =>
PCM_Float_Wav_64.Put (WF, PCM);
end case;
else
-- Always assume fixed-point PCM format
case WF.Wave_Format.Bits_Per_Sample is
when Bit_Depth_8 =>
WF.Set_Error (Wavefile_Error_Unsupported_Bit_Depth);
return;
when Bit_Depth_16 =>
PCM_Fixed_Wav_16.Put (WF, PCM);
when Bit_Depth_24 =>
PCM_Fixed_Wav_24.Put (WF, PCM);
when Bit_Depth_32 =>
PCM_Fixed_Wav_32.Put (WF, PCM);
when Bit_Depth_64 =>
WF.Set_Error (Wavefile_Error_Unsupported_Bit_Depth);
return;
end case;
end if;
end Put;
end Audio.Wavefiles.Generic_Float_PCM_IO;
| 38.833333 | 78 | 0.543324 |
1aba69478a10756e84aeab4ef179d1a08c669c1d | 836 | adb | Ada | contrib/gnu/gdb/dist/gdb/testsuite/gdb.ada/access_to_unbounded_array/pack.adb | TheSledgeHammer/2.11BSD | fe61f0b9aaa273783cd027c7b5ec77e95ead2153 | [
"BSD-3-Clause"
] | 3 | 2021-05-04T17:09:06.000Z | 2021-10-04T07:19:26.000Z | contrib/gnu/gdb/dist/gdb/testsuite/gdb.ada/access_to_unbounded_array/pack.adb | TheSledgeHammer/2.11BSD | fe61f0b9aaa273783cd027c7b5ec77e95ead2153 | [
"BSD-3-Clause"
] | null | null | null | contrib/gnu/gdb/dist/gdb/testsuite/gdb.ada/access_to_unbounded_array/pack.adb | TheSledgeHammer/2.11BSD | fe61f0b9aaa273783cd027c7b5ec77e95ead2153 | [
"BSD-3-Clause"
] | null | null | null | -- Copyright 2018-2020 Free Software Foundation, Inc.
--
-- This program is free software; you can redistribute it and/or modify
-- it under the terms of the GNU General Public License as published by
-- the Free Software Foundation; either version 3 of the License, or
-- (at your option) any later version.
--
-- This program is distributed in the hope that it will be useful,
-- but WITHOUT ANY WARRANTY; without even the implied warranty of
-- MERCHANTABILITY or FITNESS FOR A PARTICULAR PURPOSE. See the
-- GNU General Public License for more details.
--
-- You should have received a copy of the GNU General Public License
-- along with this program. If not, see <http://www.gnu.org/licenses/>.
package body Pack is
procedure Do_Nothing (A : System.Address) is
begin
null;
end Do_Nothing;
end Pack;
| 34.833333 | 73 | 0.728469 |
9a0fedaed868265c6ad043e3cea9f7af8277bd78 | 2,057 | adb | Ada | gcc-gcc-7_3_0-release/gcc/testsuite/gnat.dg/sso/p6.adb | best08618/asylo | 5a520a9f5c461ede0f32acc284017b737a43898c | [
"Apache-2.0"
] | 7 | 2020-05-02T17:34:05.000Z | 2021-10-17T10:15:18.000Z | gcc-gcc-7_3_0-release/gcc/testsuite/gnat.dg/sso/p6.adb | best08618/asylo | 5a520a9f5c461ede0f32acc284017b737a43898c | [
"Apache-2.0"
] | null | null | null | gcc-gcc-7_3_0-release/gcc/testsuite/gnat.dg/sso/p6.adb | best08618/asylo | 5a520a9f5c461ede0f32acc284017b737a43898c | [
"Apache-2.0"
] | 2 | 2020-07-27T00:22:36.000Z | 2021-04-01T09:41:02.000Z | -- { dg-do run }
with Init6; use Init6;
with Text_IO; use Text_IO;
with Dump;
procedure P6 is
Local_R1 : R1;
Local_R2 : R2;
begin
Put ("My_R1 :");
Dump (My_R1'Address, R1'Max_Size_In_Storage_Elements);
New_Line;
-- { dg-output "My_R1 : 78 56 34 12 00 ab 00 12 00 cd 00 34 00 ef 00 56.*\n" }
Put ("My_R2 :");
Dump (My_R2'Address, R2'Max_Size_In_Storage_Elements);
New_Line;
-- { dg-output "My_R2 : 12 34 56 78 12 00 ab 00 34 00 cd 00 56 00 ef 00.*\n" }
Local_R1 := My_R1;
Put ("Local_R1 :");
Dump (Local_R1'Address, R1'Max_Size_In_Storage_Elements);
New_Line;
-- { dg-output "Local_R1 : 78 56 34 12 00 ab 00 12 00 cd 00 34 00 ef 00 56.*\n" }
Local_R2 := My_R2;
Put ("Local_R2 :");
Dump (Local_R2'Address, R2'Max_Size_In_Storage_Elements);
New_Line;
-- { dg-output "Local_R2 : 12 34 56 78 12 00 ab 00 34 00 cd 00 56 00 ef 00.*\n" }
Local_R1 := (I => 16#12345678#,
A => (16#AB0012#, 16#CD0034#, 16#EF0056#));
Put ("Local_R1 :");
Dump (Local_R1'Address, R1'Max_Size_In_Storage_Elements);
New_Line;
-- { dg-output "Local_R1 : 78 56 34 12 00 ab 00 12 00 cd 00 34 00 ef 00 56.*\n" }
Local_R2 := (I => 16#12345678#,
A => (16#AB0012#, 16#CD0034#, 16#EF0056#));
Put ("Local_R2 :");
Dump (Local_R2'Address, R2'Max_Size_In_Storage_Elements);
New_Line;
-- { dg-output "Local_R2 : 12 34 56 78 12 00 ab 00 34 00 cd 00 56 00 ef 00.*\n" }
Local_R1.I := Local_R2.I;
Local_R1.A(1) := Local_R2.A(1);
Local_R1.A(2) := Local_R2.A(2);
Local_R1.A(3) := Local_R2.A(3);
Put ("Local_R1 :");
Dump (Local_R1'Address, R1'Max_Size_In_Storage_Elements);
New_Line;
-- { dg-output "Local_R1 : 78 56 34 12 00 ab 00 12 00 cd 00 34 00 ef 00 56.*\n" }
Local_R2.I := Local_R1.I;
Local_R2.A(1) := Local_R1.A(1);
Local_R2.A(2) := Local_R1.A(2);
Local_R2.A(3) := Local_R1.A(3);
Put ("Local_R2 :");
Dump (Local_R2'Address, R2'Max_Size_In_Storage_Elements);
New_Line;
-- { dg-output "Local_R2 : 12 34 56 78 12 00 ab 00 34 00 cd 00 56 00 ef 00.*\n" }
end;
| 33.177419 | 83 | 0.623238 |
1d0625559de8e7cc06c1e1d5cd8bcf7e6ebef6f3 | 7,867 | ada | Ada | gcc-gcc-7_3_0-release/gcc/testsuite/ada/acats/tests/c9/c94001c.ada | best08618/asylo | 5a520a9f5c461ede0f32acc284017b737a43898c | [
"Apache-2.0"
] | 7 | 2020-05-02T17:34:05.000Z | 2021-10-17T10:15:18.000Z | gcc-gcc-7_3_0-release/gcc/testsuite/ada/acats/tests/c9/c94001c.ada | best08618/asylo | 5a520a9f5c461ede0f32acc284017b737a43898c | [
"Apache-2.0"
] | null | null | null | gcc-gcc-7_3_0-release/gcc/testsuite/ada/acats/tests/c9/c94001c.ada | best08618/asylo | 5a520a9f5c461ede0f32acc284017b737a43898c | [
"Apache-2.0"
] | 2 | 2020-07-27T00:22:36.000Z | 2021-04-01T09:41:02.000Z | -- C94001C.ADA
-- Grant of Unlimited Rights
--
-- Under contracts F33600-87-D-0337, F33600-84-D-0280, MDA903-79-C-0687,
-- F08630-91-C-0015, and DCA100-97-D-0025, the U.S. Government obtained
-- unlimited rights in the software and documentation contained herein.
-- Unlimited rights are defined in DFAR 252.227-7013(a)(19). By making
-- this public release, the Government intends to confer upon all
-- recipients unlimited rights equal to those held by the Government.
-- These rights include rights to use, duplicate, release or disclose the
-- released technical data and computer software in whole or in part, in
-- any manner and for any purpose whatsoever, and to have or permit others
-- to do so.
--
-- DISCLAIMER
--
-- ALL MATERIALS OR INFORMATION HEREIN RELEASED, MADE AVAILABLE OR
-- DISCLOSED ARE AS IS. THE GOVERNMENT MAKES NO EXPRESS OR IMPLIED
-- WARRANTY AS TO ANY MATTER WHATSOEVER, INCLUDING THE CONDITIONS OF THE
-- SOFTWARE, DOCUMENTATION OR OTHER INFORMATION RELEASED, MADE AVAILABLE
-- OR DISCLOSED, OR THE OWNERSHIP, MERCHANTABILITY, OR FITNESS FOR A
-- PARTICULAR PURPOSE OF SAID MATERIAL.
--*
-- CHECK THAT A UNIT WITH INDIRECT DEPENDENT TASKS CREATED BY OBJECT
-- DECLARATIONS IS NOT TERMINATED UNTIL ALL INDIRECT DEPENDENT TASKS
-- BECOME TERMINATED.
-- SUBTESTS ARE:
-- (A, B) A BLOCK CONTAINING A SIMPLE TASK OBJECT, IN A BLOCK.
-- (C, D) A FUNCTION CONTAINING AN ARRAY OF TASK OBJECT, IN A
-- FUNCTION.
-- (E, F) A TASK CONTAINING AN ARRAY OF RECORD OF TASK OBJECT,
-- IN A TASK BODY.
-- CASES (B, D, F) EXIT BY RAISING AN EXCEPTION.
-- THIS TEST CONTAINS SHARED VARIABLES AND RACE CONDITIONS.
-- TBN 8/25/86
-- PWN 01/31/95 REMOVED PRAGMA PRIORITY FOR ADA 9X.
with Impdef;
WITH REPORT; USE REPORT;
WITH SYSTEM; USE SYSTEM;
PROCEDURE C94001C IS
MY_EXCEPTION : EXCEPTION;
GLOBAL : INTEGER;
TASK TYPE TT IS
ENTRY E (I : INTEGER);
END TT;
TASK BODY TT IS
LOCAL : INTEGER;
BEGIN
ACCEPT E (I : INTEGER) DO
LOCAL := I;
END E;
DELAY 30.0 * Impdef.One_Second; -- SINCE THE PARENT UNIT HAS HIGHER PRIORITY
-- AT THIS POINT, IT WILL RECEIVE CONTROL AND
-- TERMINATE IF THE ERROR IS PRESENT.
GLOBAL := LOCAL;
END TT;
BEGIN
TEST ("C94001C", "CHECK THAT A UNIT WITH INDIRECT DEPENDENT " &
"TASKS CREATED BY OBJECT DECLARATIONS IS NOT " &
"TERMINATED UNTIL ALL INDIRECT DEPENDENT TASKS " &
"BECOME TERMINATED");
--------------------------------------------------
GLOBAL := IDENT_INT (0);
BEGIN -- (A)
DECLARE
T : TT;
BEGIN
T.E (IDENT_INT(1));
END;
END; -- (A)
IF GLOBAL /= 1 THEN
FAILED ("DEPENDENT TASK NOT TERMINATED BEFORE " &
"BLOCK EXIT - 1");
END IF;
--------------------------------------------------
BEGIN -- (B)
GLOBAL := IDENT_INT (0);
BEGIN
DECLARE
T : TT;
BEGIN
T.E (IDENT_INT(2));
RAISE MY_EXCEPTION;
END;
END;
FAILED ("MY_EXCEPTION WAS NOT RAISED - 2");
EXCEPTION
WHEN MY_EXCEPTION =>
IF GLOBAL /= 2 THEN
FAILED ("DEPENDENT TASK NOT TERMINATED BEFORE " &
"BLOCK EXIT - 2");
END IF;
WHEN OTHERS =>
FAILED ("UNEXPECTED EXCEPTION - 2");
END; -- (B)
--------------------------------------------------
GLOBAL := IDENT_INT (0);
DECLARE -- (C)
OBJ_INT : INTEGER;
FUNCTION F1 RETURN INTEGER IS
I : INTEGER;
FUNCTION F2 RETURN INTEGER IS
A : ARRAY (1..1) OF TT;
BEGIN
A(1).E (IDENT_INT(3));
RETURN 0;
END F2;
BEGIN
I := F2;
RETURN (0);
END F1;
BEGIN -- (C)
OBJ_INT := F1;
IF GLOBAL /= 3 THEN
FAILED ("DEPENDENT TASK NOT TERMINATED BEFORE " &
"FUNCTION EXIT - 3");
END IF;
END; -- (C)
--------------------------------------------------
DECLARE -- (D)
OBJ_INT : INTEGER;
FUNCTION F1 RETURN INTEGER IS
I : INTEGER;
FUNCTION F2 RETURN INTEGER IS
A : ARRAY (1..1) OF TT;
BEGIN
A(1).E (IDENT_INT(4));
IF EQUAL (3, 3) THEN
RAISE MY_EXCEPTION;
END IF;
RETURN 0;
END F2;
BEGIN
I := F2;
RETURN (0);
END F1;
BEGIN -- (D)
GLOBAL := IDENT_INT (0);
OBJ_INT := F1;
FAILED ("MY_EXCEPTION WAS NOT RAISED - 4");
EXCEPTION
WHEN MY_EXCEPTION =>
IF GLOBAL /= 4 THEN
FAILED ("DEPENDENT TASK NOT TERMINATED BEFORE " &
"FUNCTION EXIT - 4");
END IF;
WHEN OTHERS =>
FAILED ("UNEXPECTED EXCEPTION - 4");
END; -- (D)
--------------------------------------------------
GLOBAL := IDENT_INT (0);
DECLARE -- (E)
DELAY_COUNT : INTEGER := 0;
TASK OUT_TSK;
TASK BODY OUT_TSK IS
TASK TSK IS
ENTRY ENT;
END TSK;
TASK BODY TSK IS
TYPE RT IS
RECORD
T : TT;
END RECORD;
AR : ARRAY (1..1) OF RT;
BEGIN
AR(1).T.E (IDENT_INT(5));
END TSK;
BEGIN
NULL;
END OUT_TSK;
BEGIN -- (E)
WHILE NOT(OUT_TSK'TERMINATED) AND DELAY_COUNT < 60 LOOP
DELAY 1.0 * Impdef.One_Long_Second;
DELAY_COUNT := DELAY_COUNT + 1;
END LOOP;
IF DELAY_COUNT = 60 THEN
FAILED ("OUT_TSK HAS NOT TERMINATED - 5");
ELSIF GLOBAL /= 5 THEN
FAILED ("DEPENDENT TASK NOT TERMINATED BEFORE " &
"BLOCK EXIT - 5");
END IF;
END; -- (E)
--------------------------------------------------
GLOBAL := IDENT_INT (0);
DECLARE
DELAY_COUNT : INTEGER := 0;
TASK OUT_TSK;
TASK BODY OUT_TSK IS
TASK TSK IS
ENTRY ENT;
END TSK;
TASK BODY TSK IS
TYPE RT IS
RECORD
T : TT;
END RECORD;
AR : ARRAY (1..1) OF RT;
BEGIN
AR(1).T.E (IDENT_INT(6));
RAISE MY_EXCEPTION;
END TSK;
BEGIN
RAISE MY_EXCEPTION;
END OUT_TSK;
BEGIN
WHILE NOT(OUT_TSK'TERMINATED) AND DELAY_COUNT < 60 LOOP
DELAY 1.0 * Impdef.One_Long_Second;
DELAY_COUNT := DELAY_COUNT + 1;
END LOOP;
IF DELAY_COUNT = 60 THEN
FAILED ("OUT_TSK HAS NOT TERMINATED - 6");
ELSIF GLOBAL /= 6 THEN
FAILED ("DEPENDENT TASK NOT TERMINATED BEFORE " &
"BLOCK EXIT - 6");
END IF;
END;
RESULT;
END C94001C;
| 29.354478 | 89 | 0.457862 |
57f01f0c8409314fffb4cea24109667a43614530 | 9,934 | ads | Ada | src/security-policies.ads | Letractively/ada-security | 027501979a0a154cd5c90d53e601a2ab06336529 | [
"Apache-2.0"
] | null | null | null | src/security-policies.ads | Letractively/ada-security | 027501979a0a154cd5c90d53e601a2ab06336529 | [
"Apache-2.0"
] | null | null | null | src/security-policies.ads | Letractively/ada-security | 027501979a0a154cd5c90d53e601a2ab06336529 | [
"Apache-2.0"
] | null | null | null | -----------------------------------------------------------------------
-- security-policies -- Security Policies
-- Copyright (C) 2010, 2011, 2012 Stephane Carrez
-- Written by Stephane Carrez ([email protected])
--
-- Licensed under the Apache License, Version 2.0 (the "License");
-- you may not use this file except in compliance with the License.
-- You may obtain a copy of the License at
--
-- http://www.apache.org/licenses/LICENSE-2.0
--
-- Unless required by applicable law or agreed to in writing, software
-- distributed under the License is distributed on an "AS IS" BASIS,
-- WITHOUT WARRANTIES OR CONDITIONS OF ANY KIND, either express or implied.
-- See the License for the specific language governing permissions and
-- limitations under the License.
-----------------------------------------------------------------------
with Ada.Finalization;
with Util.Beans.Objects;
with Util.Beans.Objects.Vectors;
with Util.Serialize.IO.XML;
with Security.Permissions;
limited with Security.Controllers;
limited with Security.Contexts;
-- == Security Policies ==
-- The Security Policy defines and implements the set of security rules that specify
-- how to protect the system or resources. The <tt>Policy_Manager</tt> maintains
-- the security policies. These policies are registered when an application starts,
-- before reading the policy configuration files.
--
-- [http://ada-security.googlecode.com/svn/wiki/PolicyModel.png]
--
-- While the policy configuration files are processed, the policy instances that have been
-- registered will create a security controller and bind it to a given permission. After
-- successful initialization, the <tt>Policy_Manager</tt> contains a list of securiy
-- controllers which are associated with each permission defined by the application.
--
-- === Authenticated Permission ===
-- The `auth-permission` is a pre-defined permission that can be configured in the XML
-- configuration. Basically the permission is granted if the security context has a principal.
-- Otherwise the permission is denied. The permission is assigned a name and is declared
-- as follows:
--
-- <policy-rules>
-- <auth-permission>
-- <name>view-profile</name>
-- </auth-permission>
-- </policy-rules>
--
-- This example defines the `view-profile` permission.
--
-- === Grant Permission ===
-- The `grant-permission` is another pre-defined permission that gives the permission whatever
-- the security context. The permission is defined as follows:
--
-- <policy-rules>
-- <grant-permission>
-- <name>anonymous</name>
-- </grant-permission>
-- </policy-rules>
--
-- This example defines the `anonymous` permission.
--
-- @include security-policies-roles.ads
-- @include security-policies-urls.ads
--- @include security-controllers.ads
package Security.Policies is
type Security_Context_Access is access all Contexts.Security_Context'Class;
type Controller_Access is access all Security.Controllers.Controller'Class;
type Controller_Access_Array is
array (Permissions.Permission_Index range <>) of Controller_Access;
type Policy_Index is new Positive;
type Policy_Context is limited interface;
type Policy_Context_Access is access all Policy_Context'Class;
type Policy_Context_Array is
array (Policy_Index range <>) of Policy_Context_Access;
type Policy_Context_Array_Access is access Policy_Context_Array;
-- ------------------------------
-- Security policy
-- ------------------------------
type Policy is abstract new Ada.Finalization.Limited_Controlled with private;
type Policy_Access is access all Policy'Class;
-- Get the policy name.
function Get_Name (From : in Policy) return String is abstract;
-- Get the policy index.
function Get_Policy_Index (From : in Policy'Class) return Policy_Index;
pragma Inline (Get_Policy_Index);
-- Prepare the XML parser to read the policy configuration.
procedure Prepare_Config (Pol : in out Policy;
Reader : in out Util.Serialize.IO.XML.Parser) is null;
-- Finish reading the XML policy configuration. The security policy implementation can use
-- this procedure to perform any configuration setup after the configuration is parsed.
procedure Finish_Config (Into : in out Policy;
Reader : in out Util.Serialize.IO.XML.Parser) is null;
-- Add a permission under the given permission name and associated with the controller.
-- To verify the permission, the controller will be called.
procedure Add_Permission (Manager : in out Policy;
Name : in String;
Permission : in Controller_Access);
Invalid_Name : exception;
Policy_Error : exception;
-- ------------------------------
-- Permission Manager
-- ------------------------------
-- The <b>Permission_Manager</b> verifies through some policy that a permission
-- is granted to a user.
type Policy_Manager (Max_Policies : Policy_Index) is
new Ada.Finalization.Limited_Controlled with private;
type Policy_Manager_Access is access all Policy_Manager'Class;
-- Get the policy with the name <b>Name</b> registered in the policy manager.
-- Returns null if there is no such policy.
function Get_Policy (Manager : in Policy_Manager;
Name : in String) return Policy_Access;
-- Add the policy to the policy manager. After a policy is added in the manager,
-- it can participate in the security policy.
-- Raises Policy_Error if the policy table is full.
procedure Add_Policy (Manager : in out Policy_Manager;
Policy : in Policy_Access);
-- Add a permission under the given permission name and associated with the controller.
-- To verify the permission, the controller will be called.
procedure Add_Permission (Manager : in out Policy_Manager;
Name : in String;
Permission : in Controller_Access);
-- Checks whether the permission defined by the <b>Permission</b> controller data is granted
-- by the security context passed in <b>Context</b>.
-- Returns true if such permission is granted.
function Has_Permission (Manager : in Policy_Manager;
Context : in Security.Contexts.Security_Context'Class;
Permission : in Security.Permissions.Permission'Class)
return Boolean;
-- Returns True if the security controller is defined for the given permission index.
function Has_Controller (Manager : in Policy_Manager;
Index : in Permissions.Permission_Index) return Boolean;
-- Create the policy contexts to be associated with the security context.
function Create_Policy_Contexts (Manager : in Policy_Manager)
return Policy_Context_Array_Access;
-- Prepare the XML parser to read the policy configuration.
procedure Prepare_Config (Manager : in out Policy_Manager;
Reader : in out Util.Serialize.IO.XML.Parser);
-- Finish reading the XML policy configuration. The security policy implementation can use
-- this procedure to perform any configuration setup after the configuration is parsed.
procedure Finish_Config (Manager : in out Policy_Manager;
Reader : in out Util.Serialize.IO.XML.Parser);
-- Read the policy file
procedure Read_Policy (Manager : in out Policy_Manager;
File : in String);
-- Initialize the permission manager.
overriding
procedure Initialize (Manager : in out Policy_Manager);
-- Finalize the permission manager.
overriding
procedure Finalize (Manager : in out Policy_Manager);
-- ------------------------------
-- Policy Configuration
-- ------------------------------
type Policy_Config is record
Id : Natural := 0;
Permissions : Util.Beans.Objects.Vectors.Vector;
Patterns : Util.Beans.Objects.Vectors.Vector;
Manager : Policy_Manager_Access;
end record;
type Policy_Config_Access is access all Policy_Config;
-- Setup the XML parser to read the <b>policy</b> description. For example:
--
-- <policy id='1'>
-- <permission>create-workspace</permission>
-- <permission>admin</permission>
-- <url-pattern>/workspace/create</url-pattern>
-- <url-pattern>/workspace/setup/*</url-pattern>
-- </policy>
--
-- This policy gives access to the URL that match one of the URL pattern if the
-- security context has the permission <b>create-workspace</b> or <b>admin</b>.
generic
Reader : in out Util.Serialize.IO.XML.Parser;
Manager : in Policy_Manager_Access;
package Reader_Config is
Config : aliased Policy_Config;
end Reader_Config;
private
subtype Permission_Index is Permissions.Permission_Index;
type Permission_Index_Array is array (Positive range <>) of Permissions.Permission_Index;
type Controller_Access_Array_Access is access all Controller_Access_Array;
type Policy_Access_Array is array (Policy_Index range <>) of Policy_Access;
type Policy is abstract new Ada.Finalization.Limited_Controlled with record
Manager : Policy_Manager_Access;
Index : Policy_Index;
end record;
type Policy_Manager (Max_Policies : Policy_Index) is
new Ada.Finalization.Limited_Controlled with record
Permissions : Controller_Access_Array_Access;
Last_Index : Permission_Index := Permission_Index'First;
-- The security policies.
Policies : Policy_Access_Array (1 .. Max_Policies);
end record;
end Security.Policies;
| 41.739496 | 96 | 0.673344 |
1308267b8e442ca033a95632baf5fdfa212c4689 | 8,954 | ads | Ada | .emacs.d/elpa/wisi-3.1.3/wisitoken_grammar_actions.ads | caqg/linux-home | eed631aae6f5e59e4f46e14f1dff443abca5fa28 | [
"Linux-OpenIB"
] | null | null | null | .emacs.d/elpa/wisi-3.1.3/wisitoken_grammar_actions.ads | caqg/linux-home | eed631aae6f5e59e4f46e14f1dff443abca5fa28 | [
"Linux-OpenIB"
] | null | null | null | .emacs.d/elpa/wisi-3.1.3/wisitoken_grammar_actions.ads | caqg/linux-home | eed631aae6f5e59e4f46e14f1dff443abca5fa28 | [
"Linux-OpenIB"
] | null | null | null | -- generated parser support file.
-- command line: wisitoken-bnf-generate.exe --generate LALR Ada re2c PROCESS wisitoken_grammar.wy
--
-- Copyright (C) 2017 - 2019 Free Software Foundation, Inc.
--
-- Author: Stephen Leake <[email protected]>
--
-- This file is part of GNU Emacs.
--
-- GNU Emacs is free software: you can redistribute it and/or modify
-- it under the terms of the GNU General Public License as published by
-- the Free Software Foundation, either version 3 of the License, or
-- (at your option) any later version.
--
-- GNU Emacs is distributed in the hope that it will be useful,
-- but WITHOUT ANY WARRANTY; without even the implied warranty of
-- MERCHANTABILITY or FITNESS FOR A PARTICULAR PURPOSE. See the
-- GNU General Public License for more details.
--
-- You should have received a copy of the GNU General Public License
-- along with GNU Emacs. If not, see <http://www.gnu.org/licenses/>.
with WisiToken.Syntax_Trees;
package Wisitoken_Grammar_Actions is
Descriptor : aliased WisiToken.Descriptor :=
(First_Terminal => 3,
Last_Terminal => 36,
First_Nonterminal => 37,
Last_Nonterminal => 56,
EOI_ID => 36,
Accept_ID => 37,
Case_Insensitive => False,
New_Line_ID => 1,
String_1_ID => 35,
String_2_ID => 34,
Image =>
(new String'("WHITESPACE"),
new String'("NEW_LINE"),
new String'("COMMENT"),
new String'("CODE"),
new String'("END"),
new String'("IF"),
new String'("KEYWORD"),
new String'("NON_GRAMMAR"),
new String'("TOKEN"),
new String'("RAW_CODE"),
new String'("REGEXP"),
new String'("ACTION"),
new String'("BAR"),
new String'("COLON"),
new String'("COLON_COLON_EQUAL"),
new String'("COMMA"),
new String'("EQUAL"),
new String'("GREATER"),
new String'("LEFT_BRACE"),
new String'("LEFT_BRACKET"),
new String'("LEFT_PAREN"),
new String'("LESS"),
new String'("MINUS"),
new String'("PERCENT"),
new String'("PLUS"),
new String'("QUESTION"),
new String'("RIGHT_BRACE"),
new String'("RIGHT_BRACKET"),
new String'("RIGHT_PAREN"),
new String'("SEMICOLON"),
new String'("SLASH"),
new String'("STAR"),
new String'("NUMERIC_LITERAL"),
new String'("IDENTIFIER"),
new String'("STRING_LITERAL_1"),
new String'("STRING_LITERAL_2"),
new String'("Wisi_EOI"),
new String'("wisitoken_accept"),
new String'("declaration"),
new String'("token_keyword_non_grammar"),
new String'("identifier_list"),
new String'("declaration_item_list"),
new String'("declaration_item"),
new String'("nonterminal"),
new String'("semicolon_opt"),
new String'("rhs_list"),
new String'("rhs"),
new String'("rhs_attribute"),
new String'("rhs_element"),
new String'("rhs_item_list"),
new String'("rhs_item"),
new String'("rhs_group_item"),
new String'("rhs_optional_item"),
new String'("rhs_multiple_item"),
new String'("rhs_alternative_list"),
new String'("compilation_unit"),
new String'("compilation_unit_list")),
Terminal_Image_Width => 17,
Image_Width => 25,
Last_Lookahead => 37);
type Token_Enum_ID is
(WHITESPACE_ID,
NEW_LINE_ID,
COMMENT_ID,
CODE_ID,
END_ID,
IF_ID,
KEYWORD_ID,
NON_GRAMMAR_ID,
TOKEN_ID,
RAW_CODE_ID,
REGEXP_ID,
ACTION_ID,
BAR_ID,
COLON_ID,
COLON_COLON_EQUAL_ID,
COMMA_ID,
EQUAL_ID,
GREATER_ID,
LEFT_BRACE_ID,
LEFT_BRACKET_ID,
LEFT_PAREN_ID,
LESS_ID,
MINUS_ID,
PERCENT_ID,
PLUS_ID,
QUESTION_ID,
RIGHT_BRACE_ID,
RIGHT_BRACKET_ID,
RIGHT_PAREN_ID,
SEMICOLON_ID,
SLASH_ID,
STAR_ID,
NUMERIC_LITERAL_ID,
IDENTIFIER_ID,
STRING_LITERAL_1_ID,
STRING_LITERAL_2_ID,
Wisi_EOI_ID,
wisitoken_accept_ID,
declaration_ID,
token_keyword_non_grammar_ID,
identifier_list_ID,
declaration_item_list_ID,
declaration_item_ID,
nonterminal_ID,
semicolon_opt_ID,
rhs_list_ID,
rhs_ID,
rhs_attribute_ID,
rhs_element_ID,
rhs_item_list_ID,
rhs_item_ID,
rhs_group_item_ID,
rhs_optional_item_ID,
rhs_multiple_item_ID,
rhs_alternative_list_ID,
compilation_unit_ID,
compilation_unit_list_ID);
type Token_Enum_ID_Array is array (Positive range <>) of Token_Enum_ID;
use all type WisiToken.Token_ID;
function "+" (Item : in Token_Enum_ID) return WisiToken.Token_ID
is (WisiToken.Token_ID'First + Token_Enum_ID'Pos (Item));
function To_Token_Enum (Item : in WisiToken.Token_ID) return Token_Enum_ID
is (Token_Enum_ID'Val (Item - WisiToken.Token_ID'First));
function "-" (Item : in WisiToken.Token_ID) return Token_Enum_ID renames To_Token_Enum;
procedure declaration_0
(User_Data : in out WisiToken.Syntax_Trees.User_Data_Type'Class;
Tree : in out WisiToken.Syntax_Trees.Tree;
Nonterm : in WisiToken.Valid_Node_Index;
Tokens : in WisiToken.Valid_Node_Index_Array);
procedure declaration_1
(User_Data : in out WisiToken.Syntax_Trees.User_Data_Type'Class;
Tree : in out WisiToken.Syntax_Trees.Tree;
Nonterm : in WisiToken.Valid_Node_Index;
Tokens : in WisiToken.Valid_Node_Index_Array);
procedure declaration_2
(User_Data : in out WisiToken.Syntax_Trees.User_Data_Type'Class;
Tree : in out WisiToken.Syntax_Trees.Tree;
Nonterm : in WisiToken.Valid_Node_Index;
Tokens : in WisiToken.Valid_Node_Index_Array);
procedure declaration_3
(User_Data : in out WisiToken.Syntax_Trees.User_Data_Type'Class;
Tree : in out WisiToken.Syntax_Trees.Tree;
Nonterm : in WisiToken.Valid_Node_Index;
Tokens : in WisiToken.Valid_Node_Index_Array);
procedure declaration_4
(User_Data : in out WisiToken.Syntax_Trees.User_Data_Type'Class;
Tree : in out WisiToken.Syntax_Trees.Tree;
Nonterm : in WisiToken.Valid_Node_Index;
Tokens : in WisiToken.Valid_Node_Index_Array);
procedure declaration_5
(User_Data : in out WisiToken.Syntax_Trees.User_Data_Type'Class;
Tree : in out WisiToken.Syntax_Trees.Tree;
Nonterm : in WisiToken.Valid_Node_Index;
Tokens : in WisiToken.Valid_Node_Index_Array);
procedure nonterminal_0
(User_Data : in out WisiToken.Syntax_Trees.User_Data_Type'Class;
Tree : in out WisiToken.Syntax_Trees.Tree;
Nonterm : in WisiToken.Valid_Node_Index;
Tokens : in WisiToken.Valid_Node_Index_Array);
procedure nonterminal_1
(User_Data : in out WisiToken.Syntax_Trees.User_Data_Type'Class;
Tree : in out WisiToken.Syntax_Trees.Tree;
Nonterm : in WisiToken.Valid_Node_Index;
Tokens : in WisiToken.Valid_Node_Index_Array);
procedure rhs_item_1
(User_Data : in out WisiToken.Syntax_Trees.User_Data_Type'Class;
Tree : in out WisiToken.Syntax_Trees.Tree;
Nonterm : in WisiToken.Valid_Node_Index;
Tokens : in WisiToken.Valid_Node_Index_Array);
procedure rhs_item_2
(User_Data : in out WisiToken.Syntax_Trees.User_Data_Type'Class;
Tree : in out WisiToken.Syntax_Trees.Tree;
Nonterm : in WisiToken.Valid_Node_Index;
Tokens : in WisiToken.Valid_Node_Index_Array);
procedure rhs_item_3
(User_Data : in out WisiToken.Syntax_Trees.User_Data_Type'Class;
Tree : in out WisiToken.Syntax_Trees.Tree;
Nonterm : in WisiToken.Valid_Node_Index;
Tokens : in WisiToken.Valid_Node_Index_Array);
procedure rhs_item_4
(User_Data : in out WisiToken.Syntax_Trees.User_Data_Type'Class;
Tree : in out WisiToken.Syntax_Trees.Tree;
Nonterm : in WisiToken.Valid_Node_Index;
Tokens : in WisiToken.Valid_Node_Index_Array);
procedure rhs_item_5
(User_Data : in out WisiToken.Syntax_Trees.User_Data_Type'Class;
Tree : in out WisiToken.Syntax_Trees.Tree;
Nonterm : in WisiToken.Valid_Node_Index;
Tokens : in WisiToken.Valid_Node_Index_Array);
procedure rhs_optional_item_3
(User_Data : in out WisiToken.Syntax_Trees.User_Data_Type'Class;
Tree : in out WisiToken.Syntax_Trees.Tree;
Nonterm : in WisiToken.Valid_Node_Index;
Tokens : in WisiToken.Valid_Node_Index_Array);
end Wisitoken_Grammar_Actions;
| 37.621849 | 99 | 0.647755 |
4bc85a4e632cdd3a7423f8fd2c3583e24d1ea786 | 34,164 | ads | Ada | arch/ARM/STM32/svd/stm32wl5x_cm0/stm32_svd-dmamux.ads | morbos/Ada_Drivers_Library | a4ab26799be60997c38735f4056160c4af597ef7 | [
"BSD-3-Clause"
] | 2 | 2018-05-16T03:56:39.000Z | 2019-07-31T13:53:56.000Z | arch/ARM/STM32/svd/stm32wl5x_cm0/stm32_svd-dmamux.ads | morbos/Ada_Drivers_Library | a4ab26799be60997c38735f4056160c4af597ef7 | [
"BSD-3-Clause"
] | null | null | null | arch/ARM/STM32/svd/stm32wl5x_cm0/stm32_svd-dmamux.ads | morbos/Ada_Drivers_Library | a4ab26799be60997c38735f4056160c4af597ef7 | [
"BSD-3-Clause"
] | null | null | null | -- This spec has been automatically generated from STM32WL5x_CM0P.svd
pragma Restrictions (No_Elaboration_Code);
pragma Ada_2012;
pragma Style_Checks (Off);
with HAL;
with System;
package STM32_SVD.DMAMUX is
pragma Preelaborate;
---------------
-- Registers --
---------------
subtype C0CR_DMAREQ_ID_Field is HAL.UInt8;
subtype C0CR_SPOL_Field is HAL.UInt2;
subtype C0CR_NBREQ_Field is HAL.UInt5;
subtype C0CR_SYNC_ID_Field is HAL.UInt5;
-- request line multiplexer channel x configuration register
type C0CR_Register is record
-- DMA request identification
DMAREQ_ID : C0CR_DMAREQ_ID_Field := 16#0#;
-- Synchronization overrun interrupt enable
SOIE : Boolean := False;
-- Event generation enable
EGE : Boolean := False;
-- unspecified
Reserved_10_15 : HAL.UInt6 := 16#0#;
-- Synchronization enable
SE : Boolean := False;
-- Synchronization polarity
SPOL : C0CR_SPOL_Field := 16#0#;
-- Number of DMA requests minus 1 to forward
NBREQ : C0CR_NBREQ_Field := 16#0#;
-- Synchronization identification
SYNC_ID : C0CR_SYNC_ID_Field := 16#0#;
-- unspecified
Reserved_29_31 : HAL.UInt3 := 16#0#;
end record
with Volatile_Full_Access, Object_Size => 32,
Bit_Order => System.Low_Order_First;
for C0CR_Register use record
DMAREQ_ID at 0 range 0 .. 7;
SOIE at 0 range 8 .. 8;
EGE at 0 range 9 .. 9;
Reserved_10_15 at 0 range 10 .. 15;
SE at 0 range 16 .. 16;
SPOL at 0 range 17 .. 18;
NBREQ at 0 range 19 .. 23;
SYNC_ID at 0 range 24 .. 28;
Reserved_29_31 at 0 range 29 .. 31;
end record;
subtype C1CR_DMAREQ_ID_Field is HAL.UInt8;
subtype C1CR_SPOL_Field is HAL.UInt2;
subtype C1CR_NBREQ_Field is HAL.UInt5;
subtype C1CR_SYNC_ID_Field is HAL.UInt5;
-- request line multiplexer channel x configuration register
type C1CR_Register is record
-- DMA request identification
DMAREQ_ID : C1CR_DMAREQ_ID_Field := 16#0#;
-- Synchronization overrun interrupt enable
SOIE : Boolean := False;
-- Event generation enable
EGE : Boolean := False;
-- unspecified
Reserved_10_15 : HAL.UInt6 := 16#0#;
-- Synchronization enable
SE : Boolean := False;
-- Synchronization polarity
SPOL : C1CR_SPOL_Field := 16#0#;
-- Number of DMA requests minus 1 to forward
NBREQ : C1CR_NBREQ_Field := 16#0#;
-- Synchronization identification
SYNC_ID : C1CR_SYNC_ID_Field := 16#0#;
-- unspecified
Reserved_29_31 : HAL.UInt3 := 16#0#;
end record
with Volatile_Full_Access, Object_Size => 32,
Bit_Order => System.Low_Order_First;
for C1CR_Register use record
DMAREQ_ID at 0 range 0 .. 7;
SOIE at 0 range 8 .. 8;
EGE at 0 range 9 .. 9;
Reserved_10_15 at 0 range 10 .. 15;
SE at 0 range 16 .. 16;
SPOL at 0 range 17 .. 18;
NBREQ at 0 range 19 .. 23;
SYNC_ID at 0 range 24 .. 28;
Reserved_29_31 at 0 range 29 .. 31;
end record;
subtype C2CR_DMAREQ_ID_Field is HAL.UInt8;
subtype C2CR_SPOL_Field is HAL.UInt2;
subtype C2CR_NBREQ_Field is HAL.UInt5;
subtype C2CR_SYNC_ID_Field is HAL.UInt5;
-- request line multiplexer channel x configuration register
type C2CR_Register is record
-- DMA request identification
DMAREQ_ID : C2CR_DMAREQ_ID_Field := 16#0#;
-- Synchronization overrun interrupt enable
SOIE : Boolean := False;
-- Event generation enable
EGE : Boolean := False;
-- unspecified
Reserved_10_15 : HAL.UInt6 := 16#0#;
-- Synchronization enable
SE : Boolean := False;
-- Synchronization polarity
SPOL : C2CR_SPOL_Field := 16#0#;
-- Number of DMA requests minus 1 to forward
NBREQ : C2CR_NBREQ_Field := 16#0#;
-- Synchronization identification
SYNC_ID : C2CR_SYNC_ID_Field := 16#0#;
-- unspecified
Reserved_29_31 : HAL.UInt3 := 16#0#;
end record
with Volatile_Full_Access, Object_Size => 32,
Bit_Order => System.Low_Order_First;
for C2CR_Register use record
DMAREQ_ID at 0 range 0 .. 7;
SOIE at 0 range 8 .. 8;
EGE at 0 range 9 .. 9;
Reserved_10_15 at 0 range 10 .. 15;
SE at 0 range 16 .. 16;
SPOL at 0 range 17 .. 18;
NBREQ at 0 range 19 .. 23;
SYNC_ID at 0 range 24 .. 28;
Reserved_29_31 at 0 range 29 .. 31;
end record;
subtype C3CR_DMAREQ_ID_Field is HAL.UInt8;
subtype C3CR_SPOL_Field is HAL.UInt2;
subtype C3CR_NBREQ_Field is HAL.UInt5;
subtype C3CR_SYNC_ID_Field is HAL.UInt5;
-- request line multiplexer channel x configuration register
type C3CR_Register is record
-- DMA request identification
DMAREQ_ID : C3CR_DMAREQ_ID_Field := 16#0#;
-- Synchronization overrun interrupt enable
SOIE : Boolean := False;
-- Event generation enable
EGE : Boolean := False;
-- unspecified
Reserved_10_15 : HAL.UInt6 := 16#0#;
-- Synchronization enable
SE : Boolean := False;
-- Synchronization polarity
SPOL : C3CR_SPOL_Field := 16#0#;
-- Number of DMA requests minus 1 to forward
NBREQ : C3CR_NBREQ_Field := 16#0#;
-- Synchronization identification
SYNC_ID : C3CR_SYNC_ID_Field := 16#0#;
-- unspecified
Reserved_29_31 : HAL.UInt3 := 16#0#;
end record
with Volatile_Full_Access, Object_Size => 32,
Bit_Order => System.Low_Order_First;
for C3CR_Register use record
DMAREQ_ID at 0 range 0 .. 7;
SOIE at 0 range 8 .. 8;
EGE at 0 range 9 .. 9;
Reserved_10_15 at 0 range 10 .. 15;
SE at 0 range 16 .. 16;
SPOL at 0 range 17 .. 18;
NBREQ at 0 range 19 .. 23;
SYNC_ID at 0 range 24 .. 28;
Reserved_29_31 at 0 range 29 .. 31;
end record;
subtype C4CR_DMAREQ_ID_Field is HAL.UInt8;
subtype C4CR_SPOL_Field is HAL.UInt2;
subtype C4CR_NBREQ_Field is HAL.UInt5;
subtype C4CR_SYNC_ID_Field is HAL.UInt5;
-- request line multiplexer channel x configuration register
type C4CR_Register is record
-- DMA request identification
DMAREQ_ID : C4CR_DMAREQ_ID_Field := 16#0#;
-- Synchronization overrun interrupt enable
SOIE : Boolean := False;
-- Event generation enable
EGE : Boolean := False;
-- unspecified
Reserved_10_15 : HAL.UInt6 := 16#0#;
-- Synchronization enable
SE : Boolean := False;
-- Synchronization polarity
SPOL : C4CR_SPOL_Field := 16#0#;
-- Number of DMA requests minus 1 to forward
NBREQ : C4CR_NBREQ_Field := 16#0#;
-- Synchronization identification
SYNC_ID : C4CR_SYNC_ID_Field := 16#0#;
-- unspecified
Reserved_29_31 : HAL.UInt3 := 16#0#;
end record
with Volatile_Full_Access, Object_Size => 32,
Bit_Order => System.Low_Order_First;
for C4CR_Register use record
DMAREQ_ID at 0 range 0 .. 7;
SOIE at 0 range 8 .. 8;
EGE at 0 range 9 .. 9;
Reserved_10_15 at 0 range 10 .. 15;
SE at 0 range 16 .. 16;
SPOL at 0 range 17 .. 18;
NBREQ at 0 range 19 .. 23;
SYNC_ID at 0 range 24 .. 28;
Reserved_29_31 at 0 range 29 .. 31;
end record;
subtype C5CR_DMAREQ_ID_Field is HAL.UInt8;
subtype C5CR_SPOL_Field is HAL.UInt2;
subtype C5CR_NBREQ_Field is HAL.UInt5;
subtype C5CR_SYNC_ID_Field is HAL.UInt5;
-- request line multiplexer channel x configuration register
type C5CR_Register is record
-- DMA request identification
DMAREQ_ID : C5CR_DMAREQ_ID_Field := 16#0#;
-- Synchronization overrun interrupt enable
SOIE : Boolean := False;
-- Event generation enable
EGE : Boolean := False;
-- unspecified
Reserved_10_15 : HAL.UInt6 := 16#0#;
-- Synchronization enable
SE : Boolean := False;
-- Synchronization polarity
SPOL : C5CR_SPOL_Field := 16#0#;
-- Number of DMA requests minus 1 to forward
NBREQ : C5CR_NBREQ_Field := 16#0#;
-- Synchronization identification
SYNC_ID : C5CR_SYNC_ID_Field := 16#0#;
-- unspecified
Reserved_29_31 : HAL.UInt3 := 16#0#;
end record
with Volatile_Full_Access, Object_Size => 32,
Bit_Order => System.Low_Order_First;
for C5CR_Register use record
DMAREQ_ID at 0 range 0 .. 7;
SOIE at 0 range 8 .. 8;
EGE at 0 range 9 .. 9;
Reserved_10_15 at 0 range 10 .. 15;
SE at 0 range 16 .. 16;
SPOL at 0 range 17 .. 18;
NBREQ at 0 range 19 .. 23;
SYNC_ID at 0 range 24 .. 28;
Reserved_29_31 at 0 range 29 .. 31;
end record;
subtype C6CR_DMAREQ_ID_Field is HAL.UInt8;
subtype C6CR_SPOL_Field is HAL.UInt2;
subtype C6CR_NBREQ_Field is HAL.UInt5;
subtype C6CR_SYNC_ID_Field is HAL.UInt5;
-- request line multiplexer channel x configuration register
type C6CR_Register is record
-- DMA request identification
DMAREQ_ID : C6CR_DMAREQ_ID_Field := 16#0#;
-- Synchronization overrun interrupt enable
SOIE : Boolean := False;
-- Event generation enable
EGE : Boolean := False;
-- unspecified
Reserved_10_15 : HAL.UInt6 := 16#0#;
-- Synchronization enable
SE : Boolean := False;
-- Synchronization polarity
SPOL : C6CR_SPOL_Field := 16#0#;
-- Number of DMA requests minus 1 to forward
NBREQ : C6CR_NBREQ_Field := 16#0#;
-- Synchronization identification
SYNC_ID : C6CR_SYNC_ID_Field := 16#0#;
-- unspecified
Reserved_29_31 : HAL.UInt3 := 16#0#;
end record
with Volatile_Full_Access, Object_Size => 32,
Bit_Order => System.Low_Order_First;
for C6CR_Register use record
DMAREQ_ID at 0 range 0 .. 7;
SOIE at 0 range 8 .. 8;
EGE at 0 range 9 .. 9;
Reserved_10_15 at 0 range 10 .. 15;
SE at 0 range 16 .. 16;
SPOL at 0 range 17 .. 18;
NBREQ at 0 range 19 .. 23;
SYNC_ID at 0 range 24 .. 28;
Reserved_29_31 at 0 range 29 .. 31;
end record;
subtype C7CR_DMAREQ_ID_Field is HAL.UInt8;
subtype C7CR_SPOL_Field is HAL.UInt2;
subtype C7CR_NBREQ_Field is HAL.UInt5;
subtype C7CR_SYNC_ID_Field is HAL.UInt5;
-- request line multiplexer channel x configuration register
type C7CR_Register is record
-- DMA request identification
DMAREQ_ID : C7CR_DMAREQ_ID_Field := 16#0#;
-- Synchronization overrun interrupt enable
SOIE : Boolean := False;
-- Event generation enable
EGE : Boolean := False;
-- unspecified
Reserved_10_15 : HAL.UInt6 := 16#0#;
-- Synchronization enable
SE : Boolean := False;
-- Synchronization polarity
SPOL : C7CR_SPOL_Field := 16#0#;
-- Number of DMA requests minus 1 to forward
NBREQ : C7CR_NBREQ_Field := 16#0#;
-- Synchronization identification
SYNC_ID : C7CR_SYNC_ID_Field := 16#0#;
-- unspecified
Reserved_29_31 : HAL.UInt3 := 16#0#;
end record
with Volatile_Full_Access, Object_Size => 32,
Bit_Order => System.Low_Order_First;
for C7CR_Register use record
DMAREQ_ID at 0 range 0 .. 7;
SOIE at 0 range 8 .. 8;
EGE at 0 range 9 .. 9;
Reserved_10_15 at 0 range 10 .. 15;
SE at 0 range 16 .. 16;
SPOL at 0 range 17 .. 18;
NBREQ at 0 range 19 .. 23;
SYNC_ID at 0 range 24 .. 28;
Reserved_29_31 at 0 range 29 .. 31;
end record;
subtype C8CR_DMAREQ_ID_Field is HAL.UInt8;
subtype C8CR_SPOL_Field is HAL.UInt2;
subtype C8CR_NBREQ_Field is HAL.UInt5;
subtype C8CR_SYNC_ID_Field is HAL.UInt5;
-- request line multiplexer channel x configuration register
type C8CR_Register is record
-- DMA request identification
DMAREQ_ID : C8CR_DMAREQ_ID_Field := 16#0#;
-- Synchronization overrun interrupt enable
SOIE : Boolean := False;
-- Event generation enable
EGE : Boolean := False;
-- unspecified
Reserved_10_15 : HAL.UInt6 := 16#0#;
-- Synchronization enable
SE : Boolean := False;
-- Synchronization polarity
SPOL : C8CR_SPOL_Field := 16#0#;
-- Number of DMA requests minus 1 to forward
NBREQ : C8CR_NBREQ_Field := 16#0#;
-- Synchronization identification
SYNC_ID : C8CR_SYNC_ID_Field := 16#0#;
-- unspecified
Reserved_29_31 : HAL.UInt3 := 16#0#;
end record
with Volatile_Full_Access, Object_Size => 32,
Bit_Order => System.Low_Order_First;
for C8CR_Register use record
DMAREQ_ID at 0 range 0 .. 7;
SOIE at 0 range 8 .. 8;
EGE at 0 range 9 .. 9;
Reserved_10_15 at 0 range 10 .. 15;
SE at 0 range 16 .. 16;
SPOL at 0 range 17 .. 18;
NBREQ at 0 range 19 .. 23;
SYNC_ID at 0 range 24 .. 28;
Reserved_29_31 at 0 range 29 .. 31;
end record;
subtype C9CR_DMAREQ_ID_Field is HAL.UInt8;
subtype C9CR_SPOL_Field is HAL.UInt2;
subtype C9CR_NBREQ_Field is HAL.UInt5;
subtype C9CR_SYNC_ID_Field is HAL.UInt5;
-- request line multiplexer channel x configuration register
type C9CR_Register is record
-- DMA request identification
DMAREQ_ID : C9CR_DMAREQ_ID_Field := 16#0#;
-- Synchronization overrun interrupt enable
SOIE : Boolean := False;
-- Event generation enable
EGE : Boolean := False;
-- unspecified
Reserved_10_15 : HAL.UInt6 := 16#0#;
-- Synchronization enable
SE : Boolean := False;
-- Synchronization polarity
SPOL : C9CR_SPOL_Field := 16#0#;
-- Number of DMA requests minus 1 to forward
NBREQ : C9CR_NBREQ_Field := 16#0#;
-- Synchronization identification
SYNC_ID : C9CR_SYNC_ID_Field := 16#0#;
-- unspecified
Reserved_29_31 : HAL.UInt3 := 16#0#;
end record
with Volatile_Full_Access, Object_Size => 32,
Bit_Order => System.Low_Order_First;
for C9CR_Register use record
DMAREQ_ID at 0 range 0 .. 7;
SOIE at 0 range 8 .. 8;
EGE at 0 range 9 .. 9;
Reserved_10_15 at 0 range 10 .. 15;
SE at 0 range 16 .. 16;
SPOL at 0 range 17 .. 18;
NBREQ at 0 range 19 .. 23;
SYNC_ID at 0 range 24 .. 28;
Reserved_29_31 at 0 range 29 .. 31;
end record;
subtype C10CR_DMAREQ_ID_Field is HAL.UInt8;
subtype C10CR_SPOL_Field is HAL.UInt2;
subtype C10CR_NBREQ_Field is HAL.UInt5;
subtype C10CR_SYNC_ID_Field is HAL.UInt5;
-- C10CR
type C10CR_Register is record
-- DMAREQ_ID
DMAREQ_ID : C10CR_DMAREQ_ID_Field := 16#0#;
-- SOIE
SOIE : Boolean := False;
-- EGE
EGE : Boolean := False;
-- unspecified
Reserved_10_15 : HAL.UInt6 := 16#0#;
-- SE
SE : Boolean := False;
-- SPOL
SPOL : C10CR_SPOL_Field := 16#0#;
-- NBREQ
NBREQ : C10CR_NBREQ_Field := 16#0#;
-- SYNC_ID
SYNC_ID : C10CR_SYNC_ID_Field := 16#0#;
-- unspecified
Reserved_29_31 : HAL.UInt3 := 16#0#;
end record
with Volatile_Full_Access, Object_Size => 32,
Bit_Order => System.Low_Order_First;
for C10CR_Register use record
DMAREQ_ID at 0 range 0 .. 7;
SOIE at 0 range 8 .. 8;
EGE at 0 range 9 .. 9;
Reserved_10_15 at 0 range 10 .. 15;
SE at 0 range 16 .. 16;
SPOL at 0 range 17 .. 18;
NBREQ at 0 range 19 .. 23;
SYNC_ID at 0 range 24 .. 28;
Reserved_29_31 at 0 range 29 .. 31;
end record;
subtype C11CR_DMAREQ_ID_Field is HAL.UInt8;
subtype C11CR_SPOL_Field is HAL.UInt2;
subtype C11CR_NBREQ_Field is HAL.UInt5;
subtype C11CR_SYNC_ID_Field is HAL.UInt5;
-- C11CR
type C11CR_Register is record
-- DMAREQ_ID
DMAREQ_ID : C11CR_DMAREQ_ID_Field := 16#0#;
-- SOIE
SOIE : Boolean := False;
-- EGE
EGE : Boolean := False;
-- unspecified
Reserved_10_15 : HAL.UInt6 := 16#0#;
-- SE
SE : Boolean := False;
-- SPOL
SPOL : C11CR_SPOL_Field := 16#0#;
-- NBREQ
NBREQ : C11CR_NBREQ_Field := 16#0#;
-- SYNC_ID
SYNC_ID : C11CR_SYNC_ID_Field := 16#0#;
-- unspecified
Reserved_29_31 : HAL.UInt3 := 16#0#;
end record
with Volatile_Full_Access, Object_Size => 32,
Bit_Order => System.Low_Order_First;
for C11CR_Register use record
DMAREQ_ID at 0 range 0 .. 7;
SOIE at 0 range 8 .. 8;
EGE at 0 range 9 .. 9;
Reserved_10_15 at 0 range 10 .. 15;
SE at 0 range 16 .. 16;
SPOL at 0 range 17 .. 18;
NBREQ at 0 range 19 .. 23;
SYNC_ID at 0 range 24 .. 28;
Reserved_29_31 at 0 range 29 .. 31;
end record;
subtype C12CR_DMAREQ_ID_Field is HAL.UInt8;
subtype C12CR_SPOL_Field is HAL.UInt2;
subtype C12CR_NBREQ_Field is HAL.UInt5;
subtype C12CR_SYNC_ID_Field is HAL.UInt5;
-- C12CR
type C12CR_Register is record
-- DMAREQ_ID
DMAREQ_ID : C12CR_DMAREQ_ID_Field := 16#0#;
-- SOIE
SOIE : Boolean := False;
-- EGE
EGE : Boolean := False;
-- unspecified
Reserved_10_15 : HAL.UInt6 := 16#0#;
-- SE
SE : Boolean := False;
-- SPOL
SPOL : C12CR_SPOL_Field := 16#0#;
-- NBREQ
NBREQ : C12CR_NBREQ_Field := 16#0#;
-- SYNC_ID
SYNC_ID : C12CR_SYNC_ID_Field := 16#0#;
-- unspecified
Reserved_29_31 : HAL.UInt3 := 16#0#;
end record
with Volatile_Full_Access, Object_Size => 32,
Bit_Order => System.Low_Order_First;
for C12CR_Register use record
DMAREQ_ID at 0 range 0 .. 7;
SOIE at 0 range 8 .. 8;
EGE at 0 range 9 .. 9;
Reserved_10_15 at 0 range 10 .. 15;
SE at 0 range 16 .. 16;
SPOL at 0 range 17 .. 18;
NBREQ at 0 range 19 .. 23;
SYNC_ID at 0 range 24 .. 28;
Reserved_29_31 at 0 range 29 .. 31;
end record;
subtype C13CR_DMAREQ_ID_Field is HAL.UInt8;
subtype C13CR_SPOL_Field is HAL.UInt2;
subtype C13CR_NBREQ_Field is HAL.UInt5;
subtype C13CR_SYNC_ID_Field is HAL.UInt5;
-- C13CR
type C13CR_Register is record
-- DMAREQ_ID
DMAREQ_ID : C13CR_DMAREQ_ID_Field := 16#0#;
-- SOIE
SOIE : Boolean := False;
-- EGE
EGE : Boolean := False;
-- unspecified
Reserved_10_15 : HAL.UInt6 := 16#0#;
-- SE
SE : Boolean := False;
-- SPOL
SPOL : C13CR_SPOL_Field := 16#0#;
-- NBREQ
NBREQ : C13CR_NBREQ_Field := 16#0#;
-- SYNC_ID
SYNC_ID : C13CR_SYNC_ID_Field := 16#0#;
-- unspecified
Reserved_29_31 : HAL.UInt3 := 16#0#;
end record
with Volatile_Full_Access, Object_Size => 32,
Bit_Order => System.Low_Order_First;
for C13CR_Register use record
DMAREQ_ID at 0 range 0 .. 7;
SOIE at 0 range 8 .. 8;
EGE at 0 range 9 .. 9;
Reserved_10_15 at 0 range 10 .. 15;
SE at 0 range 16 .. 16;
SPOL at 0 range 17 .. 18;
NBREQ at 0 range 19 .. 23;
SYNC_ID at 0 range 24 .. 28;
Reserved_29_31 at 0 range 29 .. 31;
end record;
-- CSR_SOF array
type CSR_SOF_Field_Array is array (0 .. 13) of Boolean
with Component_Size => 1, Size => 14;
-- Type definition for CSR_SOF
type CSR_SOF_Field
(As_Array : Boolean := False)
is record
case As_Array is
when False =>
-- SOF as a value
Val : HAL.UInt14;
when True =>
-- SOF as an array
Arr : CSR_SOF_Field_Array;
end case;
end record
with Unchecked_Union, Size => 14;
for CSR_SOF_Field use record
Val at 0 range 0 .. 13;
Arr at 0 range 0 .. 13;
end record;
-- request line multiplexer interrupt channel status register
type CSR_Register is record
-- Read-only. SOF0
SOF : CSR_SOF_Field;
-- unspecified
Reserved_14_31 : HAL.UInt18;
end record
with Volatile_Full_Access, Object_Size => 32,
Bit_Order => System.Low_Order_First;
for CSR_Register use record
SOF at 0 range 0 .. 13;
Reserved_14_31 at 0 range 14 .. 31;
end record;
-- CCFR_CSOF array
type CCFR_CSOF_Field_Array is array (0 .. 13) of Boolean
with Component_Size => 1, Size => 14;
-- Type definition for CCFR_CSOF
type CCFR_CSOF_Field
(As_Array : Boolean := False)
is record
case As_Array is
when False =>
-- CSOF as a value
Val : HAL.UInt14;
when True =>
-- CSOF as an array
Arr : CCFR_CSOF_Field_Array;
end case;
end record
with Unchecked_Union, Size => 14;
for CCFR_CSOF_Field use record
Val at 0 range 0 .. 13;
Arr at 0 range 0 .. 13;
end record;
-- request line multiplexer interrupt channel clear flag register
type CCFR_Register is record
-- Write-only. CSOF0
CSOF : CCFR_CSOF_Field := (As_Array => False, Val => 16#0#);
-- unspecified
Reserved_14_31 : HAL.UInt18 := 16#0#;
end record
with Volatile_Full_Access, Object_Size => 32,
Bit_Order => System.Low_Order_First;
for CCFR_Register use record
CSOF at 0 range 0 .. 13;
Reserved_14_31 at 0 range 14 .. 31;
end record;
subtype RG0CR_SIG_ID_Field is HAL.UInt5;
subtype RG0CR_GPOL_Field is HAL.UInt2;
subtype RG0CR_GNBREQ_Field is HAL.UInt5;
-- request generator channel x configuration register
type RG0CR_Register is record
-- Signal identification
SIG_ID : RG0CR_SIG_ID_Field := 16#0#;
-- unspecified
Reserved_5_7 : HAL.UInt3 := 16#0#;
-- Trigger overrun interrupt enable
OIE : Boolean := False;
-- unspecified
Reserved_9_15 : HAL.UInt7 := 16#0#;
-- DMA request generator channel x enable
GE : Boolean := False;
-- DMA request generator trigger polarity
GPOL : RG0CR_GPOL_Field := 16#0#;
-- Number of DMA requests to be generated (minus 1)
GNBREQ : RG0CR_GNBREQ_Field := 16#0#;
-- unspecified
Reserved_24_31 : HAL.UInt8 := 16#0#;
end record
with Volatile_Full_Access, Object_Size => 32,
Bit_Order => System.Low_Order_First;
for RG0CR_Register use record
SIG_ID at 0 range 0 .. 4;
Reserved_5_7 at 0 range 5 .. 7;
OIE at 0 range 8 .. 8;
Reserved_9_15 at 0 range 9 .. 15;
GE at 0 range 16 .. 16;
GPOL at 0 range 17 .. 18;
GNBREQ at 0 range 19 .. 23;
Reserved_24_31 at 0 range 24 .. 31;
end record;
subtype RG1CR_SIG_ID_Field is HAL.UInt5;
subtype RG1CR_GPOL_Field is HAL.UInt2;
subtype RG1CR_GNBREQ_Field is HAL.UInt5;
-- request generator channel x configuration register
type RG1CR_Register is record
-- Signal identification
SIG_ID : RG1CR_SIG_ID_Field := 16#0#;
-- unspecified
Reserved_5_7 : HAL.UInt3 := 16#0#;
-- Trigger overrun interrupt enable
OIE : Boolean := False;
-- unspecified
Reserved_9_15 : HAL.UInt7 := 16#0#;
-- DMA request generator channel x enable
GE : Boolean := False;
-- DMA request generator trigger polarity
GPOL : RG1CR_GPOL_Field := 16#0#;
-- Number of DMA requests to be generated (minus 1)
GNBREQ : RG1CR_GNBREQ_Field := 16#0#;
-- unspecified
Reserved_24_31 : HAL.UInt8 := 16#0#;
end record
with Volatile_Full_Access, Object_Size => 32,
Bit_Order => System.Low_Order_First;
for RG1CR_Register use record
SIG_ID at 0 range 0 .. 4;
Reserved_5_7 at 0 range 5 .. 7;
OIE at 0 range 8 .. 8;
Reserved_9_15 at 0 range 9 .. 15;
GE at 0 range 16 .. 16;
GPOL at 0 range 17 .. 18;
GNBREQ at 0 range 19 .. 23;
Reserved_24_31 at 0 range 24 .. 31;
end record;
subtype RG2CR_SIG_ID_Field is HAL.UInt5;
subtype RG2CR_GPOL_Field is HAL.UInt2;
subtype RG2CR_GNBREQ_Field is HAL.UInt5;
-- request generator channel x configuration register
type RG2CR_Register is record
-- Signal identification
SIG_ID : RG2CR_SIG_ID_Field := 16#0#;
-- unspecified
Reserved_5_7 : HAL.UInt3 := 16#0#;
-- Trigger overrun interrupt enable
OIE : Boolean := False;
-- unspecified
Reserved_9_15 : HAL.UInt7 := 16#0#;
-- DMA request generator channel x enable
GE : Boolean := False;
-- DMA request generator trigger polarity
GPOL : RG2CR_GPOL_Field := 16#0#;
-- Number of DMA requests to be generated (minus 1)
GNBREQ : RG2CR_GNBREQ_Field := 16#0#;
-- unspecified
Reserved_24_31 : HAL.UInt8 := 16#0#;
end record
with Volatile_Full_Access, Object_Size => 32,
Bit_Order => System.Low_Order_First;
for RG2CR_Register use record
SIG_ID at 0 range 0 .. 4;
Reserved_5_7 at 0 range 5 .. 7;
OIE at 0 range 8 .. 8;
Reserved_9_15 at 0 range 9 .. 15;
GE at 0 range 16 .. 16;
GPOL at 0 range 17 .. 18;
GNBREQ at 0 range 19 .. 23;
Reserved_24_31 at 0 range 24 .. 31;
end record;
subtype RG3CR_SIG_ID_Field is HAL.UInt5;
subtype RG3CR_GPOL_Field is HAL.UInt2;
subtype RG3CR_GNBREQ_Field is HAL.UInt5;
-- request generator channel x configuration register
type RG3CR_Register is record
-- Signal identification
SIG_ID : RG3CR_SIG_ID_Field := 16#0#;
-- unspecified
Reserved_5_7 : HAL.UInt3 := 16#0#;
-- Trigger overrun interrupt enable
OIE : Boolean := False;
-- unspecified
Reserved_9_15 : HAL.UInt7 := 16#0#;
-- DMA request generator channel x enable
GE : Boolean := False;
-- DMA request generator trigger polarity
GPOL : RG3CR_GPOL_Field := 16#0#;
-- Number of DMA requests to be generated (minus 1)
GNBREQ : RG3CR_GNBREQ_Field := 16#0#;
-- unspecified
Reserved_24_31 : HAL.UInt8 := 16#0#;
end record
with Volatile_Full_Access, Object_Size => 32,
Bit_Order => System.Low_Order_First;
for RG3CR_Register use record
SIG_ID at 0 range 0 .. 4;
Reserved_5_7 at 0 range 5 .. 7;
OIE at 0 range 8 .. 8;
Reserved_9_15 at 0 range 9 .. 15;
GE at 0 range 16 .. 16;
GPOL at 0 range 17 .. 18;
GNBREQ at 0 range 19 .. 23;
Reserved_24_31 at 0 range 24 .. 31;
end record;
-- RGSR_OF array
type RGSR_OF_Field_Array is array (0 .. 3) of Boolean
with Component_Size => 1, Size => 4;
-- Type definition for RGSR_OF
type RGSR_OF_Field
(As_Array : Boolean := False)
is record
case As_Array is
when False =>
-- OF as a value
Val : HAL.UInt4;
when True =>
-- OF as an array
Arr : RGSR_OF_Field_Array;
end case;
end record
with Unchecked_Union, Size => 4;
for RGSR_OF_Field use record
Val at 0 range 0 .. 3;
Arr at 0 range 0 .. 3;
end record;
-- request generator interrupt status register
type RGSR_Register is record
-- Read-only. OF0
OF_k : RGSR_OF_Field;
-- unspecified
Reserved_4_31 : HAL.UInt28;
end record
with Volatile_Full_Access, Object_Size => 32,
Bit_Order => System.Low_Order_First;
for RGSR_Register use record
OF_k at 0 range 0 .. 3;
Reserved_4_31 at 0 range 4 .. 31;
end record;
-- RGCFR_COF array
type RGCFR_COF_Field_Array is array (0 .. 3) of Boolean
with Component_Size => 1, Size => 4;
-- Type definition for RGCFR_COF
type RGCFR_COF_Field
(As_Array : Boolean := False)
is record
case As_Array is
when False =>
-- COF as a value
Val : HAL.UInt4;
when True =>
-- COF as an array
Arr : RGCFR_COF_Field_Array;
end case;
end record
with Unchecked_Union, Size => 4;
for RGCFR_COF_Field use record
Val at 0 range 0 .. 3;
Arr at 0 range 0 .. 3;
end record;
-- request generator interrupt clear flag register
type RGCFR_Register is record
-- Write-only. COF0
COF : RGCFR_COF_Field := (As_Array => False, Val => 16#0#);
-- unspecified
Reserved_4_31 : HAL.UInt28 := 16#0#;
end record
with Volatile_Full_Access, Object_Size => 32,
Bit_Order => System.Low_Order_First;
for RGCFR_Register use record
COF at 0 range 0 .. 3;
Reserved_4_31 at 0 range 4 .. 31;
end record;
-----------------
-- Peripherals --
-----------------
-- DMA request multiplexer
type DMAMUX_Peripheral is record
-- request line multiplexer channel x configuration register
C0CR : aliased C0CR_Register;
-- request line multiplexer channel x configuration register
C1CR : aliased C1CR_Register;
-- request line multiplexer channel x configuration register
C2CR : aliased C2CR_Register;
-- request line multiplexer channel x configuration register
C3CR : aliased C3CR_Register;
-- request line multiplexer channel x configuration register
C4CR : aliased C4CR_Register;
-- request line multiplexer channel x configuration register
C5CR : aliased C5CR_Register;
-- request line multiplexer channel x configuration register
C6CR : aliased C6CR_Register;
-- request line multiplexer channel x configuration register
C7CR : aliased C7CR_Register;
-- request line multiplexer channel x configuration register
C8CR : aliased C8CR_Register;
-- request line multiplexer channel x configuration register
C9CR : aliased C9CR_Register;
-- C10CR
C10CR : aliased C10CR_Register;
-- C11CR
C11CR : aliased C11CR_Register;
-- C12CR
C12CR : aliased C12CR_Register;
-- C13CR
C13CR : aliased C13CR_Register;
-- request line multiplexer interrupt channel status register
CSR : aliased CSR_Register;
-- request line multiplexer interrupt channel clear flag register
CCFR : aliased CCFR_Register;
-- request generator channel x configuration register
RG0CR : aliased RG0CR_Register;
-- request generator channel x configuration register
RG1CR : aliased RG1CR_Register;
-- request generator channel x configuration register
RG2CR : aliased RG2CR_Register;
-- request generator channel x configuration register
RG3CR : aliased RG3CR_Register;
-- request generator interrupt status register
RGSR : aliased RGSR_Register;
-- request generator interrupt clear flag register
RGCFR : aliased RGCFR_Register;
end record
with Volatile;
for DMAMUX_Peripheral use record
C0CR at 16#0# range 0 .. 31;
C1CR at 16#4# range 0 .. 31;
C2CR at 16#8# range 0 .. 31;
C3CR at 16#C# range 0 .. 31;
C4CR at 16#10# range 0 .. 31;
C5CR at 16#14# range 0 .. 31;
C6CR at 16#18# range 0 .. 31;
C7CR at 16#1C# range 0 .. 31;
C8CR at 16#20# range 0 .. 31;
C9CR at 16#24# range 0 .. 31;
C10CR at 16#28# range 0 .. 31;
C11CR at 16#2C# range 0 .. 31;
C12CR at 16#30# range 0 .. 31;
C13CR at 16#34# range 0 .. 31;
CSR at 16#80# range 0 .. 31;
CCFR at 16#84# range 0 .. 31;
RG0CR at 16#100# range 0 .. 31;
RG1CR at 16#104# range 0 .. 31;
RG2CR at 16#108# range 0 .. 31;
RG3CR at 16#10C# range 0 .. 31;
RGSR at 16#140# range 0 .. 31;
RGCFR at 16#144# range 0 .. 31;
end record;
-- DMA request multiplexer
DMAMUX_Periph : aliased DMAMUX_Peripheral
with Import, Address => DMAMUX_Base;
end STM32_SVD.DMAMUX;
| 34.932515 | 76 | 0.58067 |
ad4d776ff44d6aacc4e5e20f56453fbb8ec7dea8 | 1,016 | adb | Ada | src/fsmaker-commands-import.adb | Fabien-Chouteau/fsmaker | 3d96522852077c3865bb21ad3705f570733f1d7a | [
"MIT"
] | null | null | null | src/fsmaker-commands-import.adb | Fabien-Chouteau/fsmaker | 3d96522852077c3865bb21ad3705f570733f1d7a | [
"MIT"
] | null | null | null | src/fsmaker-commands-import.adb | Fabien-Chouteau/fsmaker | 3d96522852077c3865bb21ad3705f570733f1d7a | [
"MIT"
] | null | null | null | with FSmaker.Source;
package body FSmaker.Commands.Import is
-------------
-- Execute --
-------------
overriding
procedure Execute
(This : in out Instance;
Args : AAA.Strings.Vector)
is
Dir : Directory_Tree;
begin
This.Setup_Image;
if Args.Count /= 2 then
This.Failure ("takes exactly two arguments");
elsif (not Valid_Target_Path (Args (1))) then
This.Failure ("Invalid target path: '" & String'(Args (1)) & "'");
else
declare
Src : FSmaker.Source.Instance := FSmaker.Source.Create (Args (2));
begin
This.Target.Import (To_Target_Path (Args (1)), Src);
end ;
end if;
end Execute;
--------------------
-- Setup_Switches --
--------------------
overriding
procedure Setup_Switches
(This : in out Instance;
Config : in out CLIC.Subcommand.Switches_Configuration)
is
begin
null;
end Setup_Switches;
end FSmaker.Commands.Import;
| 22.577778 | 78 | 0.558071 |
9a65a1661164f8e59ce7175d2d45def8bee0df65 | 4,069 | adb | Ada | project/adl/arch/ARM/Nordic/drivers/nrf51-gpio-tasks_and_events.adb | corentingay/adaboy | 68f08afa246c8255a42897376d375edcb4e2efc2 | [
"MIT"
] | 2 | 2018-05-16T03:56:39.000Z | 2019-07-31T13:53:56.000Z | arch/ARM/Nordic/drivers/nrf51-gpio-tasks_and_events.adb | morbos/Ada_Drivers_Library | a4ab26799be60997c38735f4056160c4af597ef7 | [
"BSD-3-Clause"
] | null | null | null | arch/ARM/Nordic/drivers/nrf51-gpio-tasks_and_events.adb | morbos/Ada_Drivers_Library | a4ab26799be60997c38735f4056160c4af597ef7 | [
"BSD-3-Clause"
] | null | null | null | ------------------------------------------------------------------------------
-- --
-- Copyright (C) 2016, AdaCore --
-- --
-- Redistribution and use in source and binary forms, with or without --
-- modification, are permitted provided that the following conditions are --
-- met: --
-- 1. Redistributions of source code must retain the above copyright --
-- notice, this list of conditions and the following disclaimer. --
-- 2. Redistributions in binary form must reproduce the above copyright --
-- notice, this list of conditions and the following disclaimer in --
-- the documentation and/or other materials provided with the --
-- distribution. --
-- 3. Neither the name of the copyright holder nor the names of its --
-- contributors may be used to endorse or promote products derived --
-- from this software without specific prior written permission. --
-- --
-- THIS SOFTWARE IS PROVIDED BY THE COPYRIGHT HOLDERS AND CONTRIBUTORS --
-- "AS IS" AND ANY EXPRESS OR IMPLIED WARRANTIES, INCLUDING, BUT NOT --
-- LIMITED TO, THE IMPLIED WARRANTIES OF MERCHANTABILITY AND FITNESS FOR --
-- A PARTICULAR PURPOSE ARE DISCLAIMED. IN NO EVENT SHALL THE COPYRIGHT --
-- HOLDER OR CONTRIBUTORS BE LIABLE FOR ANY DIRECT, INDIRECT, INCIDENTAL, --
-- SPECIAL, EXEMPLARY, OR CONSEQUENTIAL DAMAGES (INCLUDING, BUT NOT --
-- LIMITED TO, PROCUREMENT OF SUBSTITUTE GOODS OR SERVICES; LOSS OF USE, --
-- DATA, OR PROFITS; OR BUSINESS INTERRUPTION) HOWEVER CAUSED AND ON ANY --
-- THEORY OF LIABILITY, WHETHER IN CONTRACT, STRICT LIABILITY, OR TORT --
-- (INCLUDING NEGLIGENCE OR OTHERWISE) ARISING IN ANY WAY OUT OF THE USE --
-- OF THIS SOFTWARE, EVEN IF ADVISED OF THE POSSIBILITY OF SUCH DAMAGE. --
-- --
------------------------------------------------------------------------------
with NRF51_SVD.GPIOTE; use NRF51_SVD.GPIOTE;
with HAL; use HAL;
package body nRF51.GPIO.Tasks_And_Events is
-------------
-- Disable --
-------------
procedure Disable (Chan : GPIOTE_Channel) is
begin
GPIOTE_Periph.CONFIG (Integer (Chan)).MODE := Disabled;
end Disable;
------------------
-- Enable_Event --
------------------
procedure Enable_Event
(Chan : GPIOTE_Channel;
GPIO_Pin : GPIO_Pin_Index;
Polarity : Event_Polarity)
is
CONFIG : CONFIG_Register renames GPIOTE_Periph.CONFIG (Integer (Chan));
begin
CONFIG.PSEL := UInt5 (GPIO_Pin);
CONFIG.POLARITY := (case Polarity is
when Rising_Edge => Lotohi,
when Falling_Edge => Hitolo,
when Any_Change => Toggle);
CONFIG.MODE := Event;
end Enable_Event;
-----------------
-- Enable_Task --
-----------------
procedure Enable_Task
(Chan : GPIOTE_Channel;
GPIO_Pin : GPIO_Pin_Index;
Action : Task_Action;
Initial_Value : Init_Value)
is
CONFIG : CONFIG_Register renames GPIOTE_Periph.CONFIG (Integer (Chan));
begin
CONFIG.PSEL := UInt5 (GPIO_Pin);
CONFIG.POLARITY := (case Action is
when Set_Pin => Lotohi,
when Clear_Pin => Hitolo,
when Toggle_Pin => Toggle);
CONFIG.OUTINIT := (case Initial_Value is
when Init_Set => High,
when Init_Clear => Low);
CONFIG.MODE := Task_k;
end Enable_Task;
end nRF51.GPIO.Tasks_And_Events;
| 45.719101 | 78 | 0.512902 |
38a17cf70b031873a77535b5d9de7811169a1682 | 8,941 | ads | Ada | llvm-gcc-4.2-2.9/gcc/ada/a-ztgeau.ads | vidkidz/crossbridge | ba0bf94aee0ce6cf7eb5be882382e52bc57ba396 | [
"MIT"
] | 1 | 2016-04-09T02:58:13.000Z | 2016-04-09T02:58:13.000Z | llvm-gcc-4.2-2.9/gcc/ada/a-ztgeau.ads | vidkidz/crossbridge | ba0bf94aee0ce6cf7eb5be882382e52bc57ba396 | [
"MIT"
] | null | null | null | llvm-gcc-4.2-2.9/gcc/ada/a-ztgeau.ads | vidkidz/crossbridge | ba0bf94aee0ce6cf7eb5be882382e52bc57ba396 | [
"MIT"
] | null | null | null | ------------------------------------------------------------------------------
-- --
-- GNAT RUN-TIME COMPONENTS --
-- --
-- A D A . W I D E _ W I D E _ T E X T _ I O . G E N E R I C _ A U X --
-- --
-- S p e c --
-- --
-- Copyright (C) 1992-2005, Free Software Foundation, Inc. --
-- --
-- GNAT is free software; you can redistribute it and/or modify it under --
-- terms of the GNU General Public License as published by the Free Soft- --
-- ware Foundation; either version 2, or (at your option) any later ver- --
-- sion. GNAT is distributed in the hope that it will be useful, but WITH- --
-- OUT ANY WARRANTY; without even the implied warranty of MERCHANTABILITY --
-- or FITNESS FOR A PARTICULAR PURPOSE. See the GNU General Public License --
-- for more details. You should have received a copy of the GNU General --
-- Public License distributed with GNAT; see file COPYING. If not, write --
-- to the Free Software Foundation, 51 Franklin Street, Fifth Floor, --
-- Boston, MA 02110-1301, USA. --
-- --
-- As a special exception, if other files instantiate generics from this --
-- unit, or you link this unit with other files to produce an executable, --
-- this unit does not by itself cause the resulting executable to be --
-- covered by the GNU General Public License. This exception does not --
-- however invalidate any other reasons why the executable file might be --
-- covered by the GNU Public License. --
-- --
-- GNAT was originally developed by the GNAT team at New York University. --
-- Extensive contributions were provided by Ada Core Technologies Inc. --
-- --
------------------------------------------------------------------------------
-- This package contains a set of auxiliary routines used by Wide_Wide_Text_IO
-- generic children, including for reading and writing numeric strings.
-- Note: although this is the Wide version of the package, the interface here
-- is still in terms of Character and String rather than Wide_Wide_Character
-- and Wide_Wide_String, since all numeric strings are composed entirely of
-- characters in the range of type Standard.Character, and the basic
-- conversion routines work with Character rather than Wide_Wide_Character.
package Ada.Wide_Wide_Text_IO.Generic_Aux is
-- Note: for all the Load routines, File indicates the file to be read,
-- Buf is the string into which data is stored, Ptr is the index of the
-- last character stored so far, and is updated if additional characters
-- are stored. Data_Error is raised if the input overflows Buf. The only
-- Load routines that do a file status check are Load_Skip and Load_Width
-- so one of these two routines must be called first.
procedure Check_End_Of_Field
(Buf : String;
Stop : Integer;
Ptr : Integer;
Width : Field);
-- This routine is used after doing a get operations on a numeric value.
-- Buf is the string being scanned, and Stop is the last character of
-- the field being scanned. Ptr is as set by the call to the scan routine
-- that scanned out the numeric value, i.e. it points one past the last
-- character scanned, and Width is the width parameter from the Get call.
--
-- There are two cases, if Width is non-zero, then a check is made that
-- the remainder of the field is all blanks. If Width is zero, then it
-- means that the scan routine scanned out only part of the field. We
-- have already scanned out the field that the ACVC tests seem to expect
-- us to read (even if it does not follow the syntax of the type being
-- scanned, e.g. allowing negative exponents in integers, and underscores
-- at the end of the string), so we just raise Data_Error.
procedure Check_On_One_Line (File : File_Type; Length : Integer);
-- Check to see if item of length Integer characters can fit on
-- current line. Call New_Line if not, first checking that the
-- line length can accommodate Length characters, raise Layout_Error
-- if item is too large for a single line.
function Is_Blank (C : Character) return Boolean;
-- Determines if C is a blank (space or tab)
procedure Load_Width
(File : File_Type;
Width : Field;
Buf : out String;
Ptr : in out Integer);
-- Loads exactly Width characters, unless a line mark is encountered first
procedure Load_Skip (File : File_Type);
-- Skips leading blanks and line and page marks, if the end of file is
-- read without finding a non-blank character, then End_Error is raised.
-- Note: a blank is defined as a space or horizontal tab (RM A.10.6(5)).
procedure Load
(File : File_Type;
Buf : out String;
Ptr : in out Integer;
Char : Character;
Loaded : out Boolean);
-- If next character is Char, loads it, otherwise no characters are loaded
-- Loaded is set to indicate whether or not the character was found.
procedure Load
(File : File_Type;
Buf : out String;
Ptr : in out Integer;
Char : Character);
-- Same as above, but no indication if character is loaded
procedure Load
(File : File_Type;
Buf : out String;
Ptr : in out Integer;
Char1 : Character;
Char2 : Character;
Loaded : out Boolean);
-- If next character is Char1 or Char2, loads it, otherwise no characters
-- are loaded. Loaded is set to indicate whether or not one of the two
-- characters was found.
procedure Load
(File : File_Type;
Buf : out String;
Ptr : in out Integer;
Char1 : Character;
Char2 : Character);
-- Same as above, but no indication if character is loaded
procedure Load_Digits
(File : File_Type;
Buf : out String;
Ptr : in out Integer;
Loaded : out Boolean);
-- Loads a sequence of zero or more decimal digits. Loaded is set if
-- at least one digit is loaded.
procedure Load_Digits
(File : File_Type;
Buf : out String;
Ptr : in out Integer);
-- Same as above, but no indication if character is loaded
procedure Load_Extended_Digits
(File : File_Type;
Buf : out String;
Ptr : in out Integer;
Loaded : out Boolean);
-- Like Load_Digits, but also allows extended digits a-f and A-F
procedure Load_Extended_Digits
(File : File_Type;
Buf : out String;
Ptr : in out Integer);
-- Same as above, but no indication if character is loaded
procedure Put_Item (File : File_Type; Str : String);
-- This routine is like Wide_Wide_Text_IO.Put, except that it checks for
-- overflow of bounded lines, as described in (RM A.10.6(8)). It is used
-- for all output of numeric values and of enumeration values. Note that
-- the buffer is of type String. Put_Item deals with converting this to
-- Wide_Wide_Characters as required.
procedure Store_Char
(File : File_Type;
ch : Integer;
Buf : out String;
Ptr : in out Integer);
-- Store a single character in buffer, checking for overflow and
-- adjusting the column number in the file to reflect the fact
-- that a character has been acquired from the input stream.
-- The pos value of the character to store is in ch on entry.
procedure String_Skip (Str : String; Ptr : out Integer);
-- Used in the Get from string procedures to skip leading blanks in the
-- string. Ptr is set to the index of the first non-blank. If the string
-- is all blanks, then the excption End_Error is raised, Note that blank
-- is defined as a space or horizontal tab (RM A.10.6(5)).
procedure Ungetc (ch : Integer; File : File_Type);
-- Pushes back character into stream, using ungetc. The caller has
-- checked that the file is in read status. Device_Error is raised
-- if the character cannot be pushed back. An attempt to push back
-- an end of file (EOF) is ignored.
private
pragma Inline (Is_Blank);
end Ada.Wide_Wide_Text_IO.Generic_Aux;
| 47.812834 | 79 | 0.603624 |
38db439972b60e61b44e40e89e6da0bd0d930709 | 17,422 | adb | Ada | arbitrary/e_deriv_tst_1.adb | jscparker/math_packages | b112a90338014d5c2dfae3f7265ee30841fb6cfd | [
"ISC",
"MIT"
] | 30 | 2018-12-09T01:15:04.000Z | 2022-03-20T16:14:54.000Z | arbitrary/e_deriv_tst_1.adb | jscparker/math_packages | b112a90338014d5c2dfae3f7265ee30841fb6cfd | [
"ISC",
"MIT"
] | null | null | null | arbitrary/e_deriv_tst_1.adb | jscparker/math_packages | b112a90338014d5c2dfae3f7265ee30841fb6cfd | [
"ISC",
"MIT"
] | null | null | null |
with e_Derivs;
with Ada.Numerics.Generic_Elementary_Functions;
with Extended_Real;
with Extended_Real.Elementary_Functions;
with Extended_Real.IO;
with Text_IO; use Text_IO;
procedure e_deriv_tst_1 is
type Real_8 is digits 15;
package mth is new Ada.Numerics.Generic_Elementary_Functions (Real_8);
use mth;
package ext is new Extended_Real (Real_8);
use ext;
package fnc is new ext.Elementary_Functions (Sqrt, Log, Exp, Arcsin);
use fnc;
package eio is new ext.IO; -- extented IO
use eio;
subtype Real is e_Real;
Max_Order_Of_Deriv : constant Positive := 40;
package dif is new e_Derivs (Max_Order_Of_Deriv, Real, Real_8);
use dif;
w, Phase : Real := +1.0;
Time, t : Real;
FullDuration : constant Real := +1.0;
No_Of_Steps : constant Integer := 100;
DeltaT : Real := FullDuration / (+Real_8(No_Of_Steps));
G, H : Derivatives := (others => +0.0);
Deriv0, Deriv1, Deriv2, Deriv3, Deriv4, Deriv5, Deriv6 : Real;
Error : Array(Deriv_Index) of Real := (others => +0.0);
Max_Error : Real;
Three : constant Real := +3.0;
begin
-- REMEMBER, Functions return REDUCED derivatives.
--*********************************************************************
-- Test 1. H = Exp_d(Sin_d(t))
--*********************************************************************
-- H = f(g(t)) = Exp(Sin(t))
-- d^1 H = Cos(t)*Exp(Sin(t))
-- d^2 H = (-Sin(t) + Cos(t)**2) * Exp(Sin(t))
-- d^3 H = (-Cos(t) -3*Sin(t)*Cos(t) + Cos(t)**3) * Exp(Sin(t))
-- d^4 H = ((-Cos(t) -3*Sin(t)*Cos(t) + Cos(t)**3) * Cos(t) +
-- (Sin(t) - 3*Cos(t)**2 + 3*Sin(t)**2 - 3*Sin(t)*Cos(t)**2))*Exp(Sin(t))
Max_Error := Zero;
for I in 0..No_Of_Steps loop
Time := (+Real_8 (I)) * DeltaT;
t := Time;
G := Sin_d (t);
H := Compose (Exp_d (G(0)), G); -- Exp (Sin (t))
Deriv0 := Exp (Sin (t));
Deriv1 := Cos(t) * Exp(Sin(t));
Deriv2 := (-Sin(t) + Cos(t)**2) * Exp(Sin(t));
Deriv3 := (-Cos(t) - Three*Sin(t)*Cos(t) + Cos(t)**3) * Exp(Sin(t));
Deriv4 := ((-Cos(t) -Three*Sin(t)*Cos(t) + Cos(t)**3) * Cos(t) +
(Sin(t) - Three*Cos(t)**2 + Three*Sin(t)**2
- Three*Sin(t)*Cos(t)**2))*Exp(Sin(t));
Un_Reduce (H);
Error(0) := Abs (H(0) - Deriv0);
Error(1) := Abs (H(1) - Deriv1);
Error(2) := Abs (H(2) - Deriv2);
Error(3) := Abs (H(3) - Deriv3);
Error(4) := Abs (H(4) - Deriv4);
for I in 0..4 loop
if Error(I) > Max_Error then
Max_Error := Error(I);
end if;
end loop;
end loop;
new_line; put("Max error, test 1: ");
put (e_Real_Image (Max_Error, Aft => 20));
--*********************************************************************
-- Test 2. H = Sin_d(t**3)
--*********************************************************************
-- H = f(g(t)) = Sin(t**3)
-- d^1 H = 3*t**2 * Cos(t**3)
-- d^2 H = 6*t * Cos(t**3) - 9*t**4 * Sin(t**3)
Max_Error := Zero;
for I in 0..No_Of_Steps loop
Time := (+Real_8 (I)) * DeltaT;
G := Time ** 3;
H := Compose (Sin_d (G(0)), G); -- Sin (Time**3)
Deriv0 := Sin(Time**3);
Deriv1 := (+3.0)*Time**2 * COS(Time**3);
Deriv2 := (+6.0)*Time*Cos(Time**3) - (+9.0)*Time**4*Sin(Time**3);
Un_Reduce (H);
Error(0) := Abs (H(0) - Deriv0);
Error(1) := Abs (H(1) - Deriv1);
Error(2) := Abs (H(2) - Deriv2);
for I in 0..2 loop
if Error(I) > Max_Error then
Max_Error := Error(I);
end if;
end loop;
end loop;
new_line; put("Max error, test 2: ");
put (e_Real_Image (Max_Error, Aft => 20));
--*********************************************************************
-- Test 3. H = Sin_d(t)**5
--*********************************************************************
-- H = g(t)**5 = Sin(t)**5
-- d^1 H = 5 * Cos(t) * Sin(t)**4
-- d^2 H = 20 * Cos(t)**2 * Sin(t)**3 - 5 * Sin(t)**5
-- d^3 H = -40 * Cos(t) * Sin(t)**4 + 60 * Cos(t)**3 * Sin(t)**2
-- - 25 * Cos(t) * Sin(t)**4
Max_Error := Zero;
for I in 0..No_Of_Steps loop
Time := (+Real_8 (I)) * DeltaT; t := Time;
H := Sin_d(Time) ** 5;
Deriv0 := Sin(t)**5;
Deriv1 := (+5.0) * Cos(t) * Sin(t)**4 ;
Deriv2 := (+20.0) * Cos(t)**2 * Sin(t)**3 - (+5.0) * Sin(t)**5;
Deriv3 := (-40.0) * Cos(t) * Sin(t)**4 + (+60.0) * Cos(t)**3 * Sin(t)**2
- (+25.0) * Cos(t) * Sin(t)**4;
Un_Reduce (H);
Error(0) := Abs (H(0) - Deriv0);
Error(1) := Abs (H(1) - Deriv1);
Error(2) := Abs (H(2) - Deriv2);
Error(3) := Abs (H(3) - Deriv3);
for I in 0..3 loop
if Error(I) > Max_Error then
Max_Error := Error(I);
end if;
end loop;
end loop;
new_line; put("Max error, test 3: ");
put (e_Real_Image (Max_Error, Aft => 20));
--*********************************************************************
-- Test 4. H = t**4
--*********************************************************************
-- H = = t**4
-- d^1 H = 4 * t**3
-- d^2 H = 12 * t**2
-- d^3 H = 24 * t
-- d^4 H = 24
-- d^5 H = 0
-- d^6 H = 0
Max_Error := Zero;
for I in 0..No_Of_Steps loop
Time := (+Real_8 (I)) * DeltaT; t := Time;
H := t ** 4;
Deriv0 := t ** 4;
Deriv1 := (+4.0) * t**3;
Deriv2 := (+12.0) * t**2;
Deriv3 := (+24.0) * t;
Deriv4 := +24.0;
Deriv5 := Zero;
Deriv6 := Zero;
Un_Reduce (H);
Error(0) := Abs (H(0) - Deriv0);
Error(1) := Abs (H(1) - Deriv1);
Error(2) := Abs (H(2) - Deriv2);
Error(3) := Abs (H(3) - Deriv3);
Error(4) := Abs (H(4) - Deriv4);
Error(5) := Abs (H(5) - Deriv5);
Error(6) := Abs (H(6) - Deriv6);
for I in 0..6 loop
if Error(I) > Max_Error then
Max_Error := Error(I);
end if;
end loop;
end loop;
new_line; put("Max error, test 4: ");
put (e_Real_Image (Max_Error, Aft => 20));
--*********************************************************************
-- Test 5. H = Sin_d (w * t + phase)
--*********************************************************************
-- H = Sin (w * t + phase)
-- d^1 H = w**1 * Cos (w * t + phase)
-- d^2 H = -w**2 * Sin (w * t + phase)
-- d^3 H = -w**3 * Cos (w * t + phase)
-- d^4 H = w**4 * Sin (w * t + phase)
-- d^5 H = w**5 * Cos (w * t + phase)
-- d^6 H = -w**6 * Sin (w * t + phase)
Max_Error := Zero;
w := +0.92345;
phase := +0.34567;
for I in 0..No_Of_Steps loop
Time := (+Real_8 (I)) * DeltaT; t := Time;
H := Sin_d (t, w, phase);
Deriv0 := Sin (w * t + phase);
Deriv1 := w**1 * Cos (w * t + phase);
Deriv2 := -w**2 * Sin (w * t + phase);
Deriv3 := -w**3 * Cos (w * t + phase);
Deriv4 := w**4 * Sin (w * t + phase);
Deriv5 := w**5 * Cos (w * t + phase);
Deriv6 := -w**6 * Sin (w * t + phase);
Un_Reduce (H);
Error(0) := Abs (H(0) - Deriv0);
Error(1) := Abs (H(1) - Deriv1);
Error(2) := Abs (H(2) - Deriv2);
Error(3) := Abs (H(3) - Deriv3);
Error(4) := Abs (H(4) - Deriv4);
Error(5) := Abs (H(5) - Deriv5);
Error(6) := Abs (H(6) - Deriv6);
for I in 0..6 loop
if Error(I) > Max_Error then
Max_Error := Error(I);
end if;
end loop;
end loop;
new_line; put("Max error, test 5: ");
put (e_Real_Image (Max_Error, Aft => 20));
--*********************************************************************
-- Test 6. H = Log_d (w * t + phase).
-- This also test Reciprocal : Real -> Derivative.
--*********************************************************************
Max_Error := Zero;
w := +0.22345;
phase := +0.34567;
for I in 0..No_Of_Steps loop
Time := (+Real_8 (I)) * DeltaT; t := Time;
H := Log_d (t, w, phase);
Deriv0 := Log (w * t + phase);
Deriv1 := w**1 / (w * t + phase);
Deriv2 := -w**2 / (w * t + phase)**2;
Deriv3 := (+2.0) * w**3 / (w * t + phase)**3;
Deriv4 := (-6.0) * w**4 / (w * t + phase)**4;
Deriv5 := (+24.0) * w**5 / (w * t + phase)**5;
Deriv6 := (-120.0) * w**6 / (w * t + phase)**6;
Un_Reduce (H);
Error(0) := Abs (H(0) - Deriv0);
Error(1) := Abs (H(1) - Deriv1);
Error(2) := Abs (H(2) - Deriv2);
Error(3) := Abs (H(3) - Deriv3);
Error(4) := Abs (H(4) - Deriv4);
Error(5) := Abs (H(5) - Deriv5);
Error(6) := Abs (H(6) - Deriv6);
for I in 0..6 loop
if Error(I) > Max_Error then
Max_Error := Error(I);
end if;
end loop;
end loop;
new_line; put("Max error, test 6: ");
put (e_Real_Image (Max_Error, Aft => 20));
--*********************************************************************
-- Test 7. H = Cos_d (w * t + phase)
--*********************************************************************
Max_Error := Zero;
w := +0.92345;
phase := +0.34567;
for I in 0..No_Of_Steps loop
Time := (+Real_8 (I)) * DeltaT; t := Time;
H := Cos_d (t, w, phase);
Deriv0 := Cos (w * t + phase);
Deriv1 := -w**1 * Sin (w * t + phase);
Deriv2 := -w**2 * Cos (w * t + phase);
Deriv3 := w**3 * Sin (w * t + phase);
Deriv4 := w**4 * Cos (w * t + phase);
Deriv5 := -w**5 * Sin (w * t + phase);
Deriv6 := -w**6 * Cos (w * t + phase);
Un_Reduce (H);
Error(0) := Abs (H(0) - Deriv0);
Error(1) := Abs (H(1) - Deriv1);
Error(2) := Abs (H(2) - Deriv2);
Error(3) := Abs (H(3) - Deriv3);
Error(4) := Abs (H(4) - Deriv4);
Error(5) := Abs (H(5) - Deriv5);
Error(6) := Abs (H(6) - Deriv6);
for I in 0..6 loop
if Error(I) > Max_Error then
Max_Error := Error(I);
end if;
end loop;
end loop;
new_line; put("Max error, test 7: ");
put (e_Real_Image (Max_Error, Aft => 20));
--*********************************************************************
-- Test 8. H = Sin_d / Cos_d;
--*********************************************************************
Max_Error := Zero;
for I in 0..No_Of_Steps loop
Time := (+Real_8 (I)) * DeltaT; t := Time;
H := Sin_d (t) / Cos_d (t);
Deriv0 := Sin(t) / Cos(t);
Deriv1 := (+1.0) / Cos(t)**2;
Deriv2 := (+2.0) * Sin(t) / Cos(t)**3;
Deriv3 := (+2.0) / Cos(t)**2 + (+6.0) * Sin(t)**2 / Cos(t)**4;
Deriv4 := (+4.0) * Sin(t) / Cos(t)**3 + (+12.0) * Sin(t) / Cos (t)**3
+ (+24.0) * Sin(t)**3 / Cos(t)**5;
Un_Reduce (H);
Error(0) := Abs (H(0) - Deriv0);
Error(1) := Abs (H(1) - Deriv1);
Error(2) := Abs (H(2) - Deriv2);
Error(3) := Abs (H(3) - Deriv3);
Error(4) := Abs (H(4) - Deriv4);
for I in 0..4 loop
if Error(I) > Max_Error then
Max_Error := Error(I);
end if;
end loop;
end loop;
new_line; put("Max error, test 8: ");
put (e_Real_Image (Max_Error, Aft => 20));
--*********************************************************************
-- Test 9. H = Sqrt_d;
--*********************************************************************
Max_Error := Zero;
DeltaT := One / (+(No_Of_Steps + 1));
for I in 2..No_Of_Steps loop
Time := (+Real_8 (I)) * DeltaT; t := Time;
H := Sqrt_d (t);
Deriv0 := Sqrt(t);
Deriv1 := (+0.5) / Sqrt (t);
Deriv2 := -(+0.5)*(+0.5)/ ((t) * Sqrt (t));
Deriv3 := (+0.5)*(+0.5)*(+0.5)*(+3.0)/ (t * t * Sqrt (t));
--Deriv4 := -(+0.5)*(+0.5)*(+0.5)*(+0.5)*(+3.0)*(+5.0)/ (t * t * t * Sqrt (t));
Un_Reduce (H);
Error(0) := Abs (H(0) - Deriv0);
Error(1) := Abs (H(1) - Deriv1);
Error(2) := Abs (H(2) - Deriv2);
Error(3) := Abs (H(3) - Deriv3);
--Error(4) := Abs (H(4) - Deriv4);
for I in 0..3 loop
if Error(I) > Max_Error then
Max_Error := Error(I);
end if;
end loop;
end loop;
new_line; put("Max error, test 9: ");
put (e_Real_Image (Max_Error, Aft => 20));
--*********************************************************************
-- Test 10. H = Arcsin_d; tests Compose and "/".
--*********************************************************************
Max_Error := Zero;
DeltaT := One / (+Real_8(No_Of_Steps + 7));
for I in 1..No_Of_Steps loop
Time := (+Real_8 (I)) * DeltaT;
t := Time;
H := Arcsin_d (t);
Deriv0 := Arcsin(t);
Deriv1 := One / Sqrt (One - t*t);
Deriv2 := t / ((One - t*t) * Sqrt (One - t*t));
Deriv3 := One / ((One - t*t) * Sqrt (One - t*t))
+ (+3.0)*t*t / ((One - t*t)*(One - t*t) * Sqrt (One - t*t));
Deriv4 := (+9.0)* t / ((One - t*t)*(One - t*t)*Sqrt (One - t*t))
+ (+3.0)*(+5.0)*t*t*t / ((One - t*t)*(One - t*t)*(One - t*t)*Sqrt (One - t*t));
Un_Reduce (H);
Error(0) := Abs (H(0) - Deriv0);
Error(1) := Abs (H(1) - Deriv1);
Error(2) := Abs (H(2) - Deriv2);
Error(3) := Abs (H(3) - Deriv3);
--Error(4) := Abs (H(4) - Deriv4);
for I in 0..3 loop
if Error(I) > Max_Error then
Max_Error := Error(I);
end if;
end loop;
end loop;
new_line; put("Max error, test 10: ");
put (e_Real_Image (Max_Error, Aft => 20));
--*********************************************************************
-- Test 11. H = Arctan_d; tests Compose and "/".
--*********************************************************************
Max_Error := Zero;
DeltaT := One / (+(No_Of_Steps + 7));
for I in 1..No_Of_Steps loop
Time := (+Real_8(I)) * DeltaT;
t := Time;
H := Arctan_d (t);
Deriv0 := Arcsin (t / Sqrt (One + t*t));
Deriv1 := One / (One + t*t);
Deriv2 := -(+2.0) * t / ((One + t*t)**2);
Deriv3 := -(+2.0) / ((One + t*t)**2)
+ (+8.0)*t*t / ((One + t*t)**3);
Un_Reduce (H);
Error(0) := Abs (H(0) - Deriv0);
Error(1) := Abs (H(1) - Deriv1);
Error(2) := Abs (H(2) - Deriv2);
Error(3) := Abs (H(3) - Deriv3);
for I in 0..3 loop
if Error(I) > Max_Error then
Max_Error := Error(I);
end if;
end loop;
end loop;
new_line; put("Max error, test 11: ");
put (e_Real_Image (Max_Error, Aft => 20));
--*********************************************************************
-- Test 12. H = Exp_d (Log_d (t))
--
-- Test the reduced derivs. Un-reduced get too large.
--*********************************************************************
-- H = f(g(t)) = Exp_d (Log_d (t))
-- d^1 H = One
-- d^2 H = Zero
Max_Error := Zero;
for I in 0..No_Of_Steps loop
Time := (+Real_8 (I)) * (+0.5) + (+5.0);
t := Time;
G := Log_d (t);
H := Compose (Exp_d (G(0)), G); -- Exp (Log (t))
Deriv0 := t;
Deriv1 := One;
Deriv2 := Zero;
--Un_Reduce (H);
Error(0) := Abs (H(0) - Deriv0);
Error(1) := Abs (H(1) - Deriv1);
Error(2) := Abs ((+2.0)*H(2) - Deriv2);
for I in 3..Max_Order_Of_Deriv loop
Error(I) := Abs (H(I));
end loop;
for I in 0..Max_Order_Of_Deriv loop
if Error(I) > Max_Error then
Max_Error := Error(I);
end if;
end loop;
end loop;
new_line; put("Max error, test 12: ");
put (e_Real_Image (Max_Error, Aft => 20));
--*********************************************************************
-- Test 13. H = Sin_d (Arcsin_d (t))
--
-- Test the reduced derivs. Un-reduced get too large.
--*********************************************************************
-- H = f(g(t)) = Sin_d (Arcsin_d (t))
-- d^1 H = One
-- d^2 H = Zero
Max_Error := Zero;
for I in 0..No_Of_Steps loop
Time := (+Real_8 (I + 1)) * DeltaT / (+Real_8 (I + 2));
t := Time;
G := Arcsin_d (t);
H := Compose (Sin_d (G(0)), G); -- Sin_d (Arcsin_d (t))
Deriv0 := t;
Deriv1 := One;
Deriv2 := Zero;
--Un_Reduce (H);
Error(0) := Abs (H(0) - Deriv0);
Error(1) := Abs (H(1) - Deriv1);
Error(2) := Abs ((+2.0)*H(2) - Deriv2);
for I in 3..Max_Order_Of_Deriv loop
Error(I) := Abs (H(I));
end loop;
for I in 0..Max_Order_Of_Deriv loop
if Error(I) > Max_Error then
Max_Error := Error(I);
end if;
end loop;
end loop;
new_line; put("Max error, test 13: ");
put (e_Real_Image (Max_Error, Aft => 20));
end;
| 29.18258 | 86 | 0.394214 |
ad156450258efd3f86850bbcd2c7808885447219 | 3,176 | ada | Ada | gcc-gcc-7_3_0-release/gcc/testsuite/ada/acats/tests/cd/cd2b11f.ada | best08618/asylo | 5a520a9f5c461ede0f32acc284017b737a43898c | [
"Apache-2.0"
] | 7 | 2020-05-02T17:34:05.000Z | 2021-10-17T10:15:18.000Z | gcc-gcc-7_3_0-release/gcc/testsuite/ada/acats/tests/cd/cd2b11f.ada | best08618/asylo | 5a520a9f5c461ede0f32acc284017b737a43898c | [
"Apache-2.0"
] | null | null | null | gcc-gcc-7_3_0-release/gcc/testsuite/ada/acats/tests/cd/cd2b11f.ada | best08618/asylo | 5a520a9f5c461ede0f32acc284017b737a43898c | [
"Apache-2.0"
] | 2 | 2020-07-27T00:22:36.000Z | 2021-04-01T09:41:02.000Z | -- CD2B11F.ADA
-- Grant of Unlimited Rights
--
-- Under contracts F33600-87-D-0337, F33600-84-D-0280, MDA903-79-C-0687,
-- F08630-91-C-0015, and DCA100-97-D-0025, the U.S. Government obtained
-- unlimited rights in the software and documentation contained herein.
-- Unlimited rights are defined in DFAR 252.227-7013(a)(19). By making
-- this public release, the Government intends to confer upon all
-- recipients unlimited rights equal to those held by the Government.
-- These rights include rights to use, duplicate, release or disclose the
-- released technical data and computer software in whole or in part, in
-- any manner and for any purpose whatsoever, and to have or permit others
-- to do so.
--
-- DISCLAIMER
--
-- ALL MATERIALS OR INFORMATION HEREIN RELEASED, MADE AVAILABLE OR
-- DISCLOSED ARE AS IS. THE GOVERNMENT MAKES NO EXPRESS OR IMPLIED
-- WARRANTY AS TO ANY MATTER WHATSOEVER, INCLUDING THE CONDITIONS OF THE
-- SOFTWARE, DOCUMENTATION OR OTHER INFORMATION RELEASED, MADE AVAILABLE
-- OR DISCLOSED, OR THE OWNERSHIP, MERCHANTABILITY, OR FITNESS FOR A
-- PARTICULAR PURPOSE OF SAID MATERIAL.
--*
-- OBJECTIVE:
-- CHECK THAT IF A COLLECTION SIZE SPECIFICATION IS GIVEN FOR AN
-- ACCESS TYPE WHOSE DESIGNATED TYPE IS A DISCRIMINATED RECORD, THEN
-- OPERATIONS ON VALUES OF THE ACCESS TYPE ARE NOT AFFECTED.
-- HISTORY:
-- BCB 09/29/87 CREATED ORIGINAL TEST.
-- PWB 05/11/89 CHANGED EXTENSION FROM '.DEP' TO '.ADA'.
WITH REPORT; USE REPORT;
PROCEDURE CD2B11F IS
BASIC_SIZE : CONSTANT := 1024;
TYPE RECORD_TYPE(DISC : INTEGER := 100) IS RECORD
COMP1 : INTEGER;
COMP2 : INTEGER;
COMP3 : INTEGER;
END RECORD;
TYPE ACC_RECORD IS ACCESS RECORD_TYPE;
FOR ACC_RECORD'STORAGE_SIZE USE BASIC_SIZE;
CHECK_RECORD1 : ACC_RECORD;
CHECK_RECORD2 : ACC_RECORD;
BEGIN
TEST ("CD2B11F", "CHECK THAT IF A COLLECTION SIZE SPECIFICATION " &
"IS GIVEN FOR AN ACCESS TYPE WHOSE " &
"DESIGNATED TYPE IS A DISCRIMINATED RECORD, " &
"THEN OPERATIONS ON VALUES OF THE ACCESS TYPE " &
"ARE NOT AFFECTED");
CHECK_RECORD1 := NEW RECORD_TYPE;
CHECK_RECORD1.COMP1 := 25;
CHECK_RECORD1.COMP2 := 25;
CHECK_RECORD1.COMP3 := 150;
IF ACC_RECORD'STORAGE_SIZE < BASIC_SIZE THEN
FAILED ("INCORRECT VALUE FOR RECORD TYPE ACCESS " &
"STORAGE_SIZE");
END IF;
IF CHECK_RECORD1.DISC /= IDENT_INT (100) THEN
FAILED ("INCORRECT VALUE FOR RECORD DISCRIMINANT");
END IF;
IF ((CHECK_RECORD1.COMP1 /= CHECK_RECORD1.COMP2) OR
(CHECK_RECORD1.COMP1 = CHECK_RECORD1.COMP3)) THEN
FAILED ("INCORRECT VALUE FOR RECORD COMPONENT");
END IF;
IF EQUAL (3,3) THEN
CHECK_RECORD2 := CHECK_RECORD1;
END IF;
IF CHECK_RECORD2 /= CHECK_RECORD1 THEN
FAILED ("INCORRECT RESULTS FOR RELATIONAL OPERATOR");
END IF;
RESULT;
END CD2B11F;
| 35.685393 | 79 | 0.642317 |
38d0c129b5079033df039ace62f795a4070477ae | 9,349 | ads | Ada | src/natools-web-comments.ads | faelys/natools-web | f7ba99f2ffb6f5a06d1b1e8becbf5f92fd58c750 | [
"0BSD"
] | 1 | 2015-04-23T10:48:58.000Z | 2015-04-23T10:48:58.000Z | src/natools-web-comments.ads | faelys/natools-web | f7ba99f2ffb6f5a06d1b1e8becbf5f92fd58c750 | [
"0BSD"
] | null | null | null | src/natools-web-comments.ads | faelys/natools-web | f7ba99f2ffb6f5a06d1b1e8becbf5f92fd58c750 | [
"0BSD"
] | null | null | null | ------------------------------------------------------------------------------
-- Copyright (c) 2015-2019, Natacha Porté --
-- --
-- Permission to use, copy, modify, and distribute this software for any --
-- purpose with or without fee is hereby granted, provided that the above --
-- copyright notice and this permission notice appear in all copies. --
-- --
-- THE SOFTWARE IS PROVIDED "AS IS" AND THE AUTHOR DISCLAIMS ALL WARRANTIES --
-- WITH REGARD TO THIS SOFTWARE INCLUDING ALL IMPLIED WARRANTIES OF --
-- MERCHANTABILITY AND FITNESS. IN NO EVENT SHALL THE AUTHOR BE LIABLE FOR --
-- ANY SPECIAL, DIRECT, INDIRECT, OR CONSEQUENTIAL DAMAGES OR ANY DAMAGES --
-- WHATSOEVER RESULTING FROM LOSS OF USE, DATA OR PROFITS, WHETHER IN AN --
-- ACTION OF CONTRACT, NEGLIGENCE OR OTHER TORTIOUS ACTION, ARISING OUT OF --
-- OR IN CONNECTION WITH THE USE OR PERFORMANCE OF THIS SOFTWARE. --
------------------------------------------------------------------------------
------------------------------------------------------------------------------
-- Natools.Web.Comments provides an implementation of user-posted comments --
-- like is commonly found on blogs. --
------------------------------------------------------------------------------
with Natools.S_Expressions.Atom_Refs;
with Natools.S_Expressions.Lockable;
with Natools.S_Expressions.Printers;
with Natools.Web.Sites;
with Natools.Web.Tags;
private with Ada.Calendar.Time_Zones;
private with Ada.Containers.Doubly_Linked_Lists;
private with Ada.Finalization;
private with Natools.Constant_Indefinite_Ordered_Maps;
private with Natools.References;
private with Natools.Storage_Pools;
private with Natools.Web.Containers;
private with Natools.Web.Sites.Updates;
package Natools.Web.Comments is
type Comment_Ref is new Tags.Visible with private;
overriding procedure Render
(Exchange : in out Sites.Exchange;
Object : in Comment_Ref;
Expression : in out S_Expressions.Lockable.Descriptor'Class);
-- Render a comment
type Comment_List is tagged private;
function Is_Null (Object : in Comment_List) return Boolean;
-- Return whether the list is usable (even if empty)
procedure Live_Load
(Object : in out Comment_List;
Site : in Sites.Site;
Parent : in Tags.Visible_Access := null;
Parent_Path : in S_Expressions.Atom_Refs.Immutable_Reference
:= S_Expressions.Atom_Refs.Null_Immutable_Reference);
-- Load comment list from Site back-end and register all comments
procedure Load
(Object : in out Comment_List;
Builder : in out Sites.Site_Builder;
Parent : in Tags.Visible_Access := null;
Parent_Path : in S_Expressions.Atom_Refs.Immutable_Reference
:= S_Expressions.Atom_Refs.Null_Immutable_Reference);
-- Load comment list from Builder back-end and register all comments
procedure Render
(Exchange : in out Sites.Exchange;
Object : in Comment_List;
Expression : in out S_Expressions.Lockable.Descriptor'Class);
-- Render a comment list
procedure Respond
(List : in out Comment_List;
Exchange : in out Sites.Exchange;
Extra_Path : in S_Expressions.Atom);
-- Respond to a request for the comment list
procedure Set
(List : out Comment_List;
Expression : in out S_Expressions.Lockable.Descriptor'Class);
-- (Re)initialize List using data from Expression
procedure Set
(List : out Comment_List;
Template : in out S_Expressions.Lockable.Descriptor'Class;
Expression : in out S_Expressions.Lockable.Descriptor'Class;
Path_Override : in S_Expressions.Atom_Refs.Immutable_Reference
:= S_Expressions.Atom_Refs.Null_Immutable_Reference);
-- (Re)initialize List using data from Template overriden by Expression
private
package Comment_Atoms is
type Enum is (Name, Mail, Link, Text, Class, Note, Title, Filter);
type Set is array (Enum) of S_Expressions.Atom_Refs.Immutable_Reference;
end Comment_Atoms;
package Comment_Flags is
type Enum is (Preprocessed, Ignored);
type Set is array (Enum) of Boolean with Pack;
end Comment_Flags;
package List_Flags is
type Enum is
(Ignore_By_Default, Allow_Date_Override, Closed, Allow_Ignore);
type Set is array (Enum) of Boolean with Pack;
end List_Flags;
type Comment_Data is record
Date : Ada.Calendar.Time;
Offset : Ada.Calendar.Time_Zones.Time_Offset;
Id : S_Expressions.Atom_Refs.Immutable_Reference;
Atoms : Comment_Atoms.Set;
Flags : Comment_Flags.Set := (others => False);
Parent : Tags.Visible_Access;
Rank : Positive;
end record;
procedure Preprocess
(Comment : in out Comment_Data;
List : in Comment_List;
Site : in Sites.Site);
procedure Preprocess
(Comment : in out Comment_Data;
List : in Comment_List;
Builder : in Sites.Site_Builder);
-- Preprocess comment field contents
procedure Write
(Comment : in Comment_Data;
Output : in out S_Expressions.Printers.Printer'Class);
-- Serialize a comment into the given S_Expression stream
package Comment_Maps is new Natools.Constant_Indefinite_Ordered_Maps
(S_Expressions.Atom, Comment_Data, S_Expressions."<");
procedure Set_Parent
(Container : in out Comment_Maps.Updatable_Map;
Parent : in Tags.Visible_Access);
procedure Update_Ranks (Container : in out Comment_Maps.Updatable_Map);
protected type Comment_Container is
procedure Initialize
(Data : in Comment_Maps.Unsafe_Maps.Map;
Parent : in Tags.Visible_Access);
procedure Insert (Data : in Comment_Data);
procedure Ignore
(Id : in S_Expressions.Atom;
Ref : out S_Expressions.Atom_Refs.Immutable_Reference);
procedure Orphan;
function Find (Id : S_Expressions.Atom_Refs.Immutable_Reference)
return Comment_Maps.Cursor;
function First return Comment_Maps.Cursor;
function Iterate
return Comment_Maps.Map_Iterator_Interfaces.Reversible_Iterator'Class;
function Length return Natural;
private
Map : Comment_Maps.Updatable_Map;
Parent : Tags.Visible_Access;
end Comment_Container;
package Container_Refs is new References
(Comment_Container,
Storage_Pools.Access_In_Default_Pool'Storage_Pool,
Storage_Pools.Access_In_Default_Pool'Storage_Pool);
type Comment_Ref is new Tags.Visible with record
Container : Container_Refs.Reference;
Id : S_Expressions.Atom_Refs.Immutable_Reference;
end record;
type Comment_List is new Ada.Finalization.Controlled with record
Backend_Name : S_Expressions.Atom_Refs.Immutable_Reference;
Backend_Path : S_Expressions.Atom_Refs.Immutable_Reference;
Parent_Path : S_Expressions.Atom_Refs.Immutable_Reference;
Comments : Container_Refs.Reference;
Post_Filter : S_Expressions.Atom_Refs.Immutable_Reference;
Tags : Containers.Atom_Array_Refs.Immutable_Reference;
Text_Filters : Containers.Atom_Array_Refs.Immutable_Reference;
Default_Text_Filter : S_Expressions.Atom_Refs.Immutable_Reference;
Flags : List_Flags.Set := (others => False);
Parent : Web.Tags.Visible_Access;
end record;
overriding procedure Finalize (Object : in out Comment_List);
function Is_Null (Object : in Comment_List) return Boolean
is (Object.Backend_Name.Is_Empty or else Object.Backend_Path.Is_Empty);
type Comment_Inserter is new Sites.Updates.Site_Update with record
Container : Container_Refs.Reference;
Id : S_Expressions.Atom_Refs.Immutable_Reference;
Tags : Containers.Atom_Array_Refs.Immutable_Reference;
end record;
overriding procedure Update
(Self : in Comment_Inserter;
Site : in out Sites.Site);
package Id_Lists is new Ada.Containers.Doubly_Linked_Lists
(S_Expressions.Atom_Refs.Immutable_Reference,
S_Expressions.Atom_Refs."=");
type Comment_Remover is new Sites.Updates.Site_Update with record
Container : Container_Refs.Reference;
Ids : Id_Lists.List;
Tags : Containers.Atom_Array_Refs.Immutable_Reference;
end record;
overriding procedure Update
(Self : in Comment_Remover;
Site : in out Sites.Site);
Empty_List : constant Comment_List
:= (Ada.Finalization.Controlled with
Backend_Name => S_Expressions.Atom_Refs.Null_Immutable_Reference,
Backend_Path => S_Expressions.Atom_Refs.Null_Immutable_Reference,
Parent_Path => S_Expressions.Atom_Refs.Null_Immutable_Reference,
Comments => Container_Refs.Null_Reference,
Parent => null,
Post_Filter => S_Expressions.Atom_Refs.Null_Immutable_Reference,
Tags => Containers.Atom_Array_Refs.Null_Immutable_Reference,
Text_Filters => Containers.Atom_Array_Refs.Null_Immutable_Reference,
Default_Text_Filter
=> S_Expressions.Atom_Refs.Null_Immutable_Reference,
Flags => (others => False));
end Natools.Web.Comments;
| 37.850202 | 78 | 0.683389 |
3d5ee41a56d6c18a527602b01354f9a700ba30ef | 9,725 | ads | Ada | src/fonts/geste_fonts-freemonooblique6pt7b.ads | Fabien-Chouteau/GESTE | 5ac814906fdb49d880db60cbb17279cbbb777336 | [
"BSD-3-Clause"
] | 13 | 2018-07-31T12:11:46.000Z | 2021-11-19T14:16:46.000Z | src/fonts/geste_fonts-freemonooblique6pt7b.ads | gregkrsak/GESTE | 5ac814906fdb49d880db60cbb17279cbbb777336 | [
"BSD-3-Clause"
] | 1 | 2018-10-22T21:41:59.000Z | 2018-10-22T21:41:59.000Z | src/fonts/geste_fonts-freemonooblique6pt7b.ads | gregkrsak/GESTE | 5ac814906fdb49d880db60cbb17279cbbb777336 | [
"BSD-3-Clause"
] | 4 | 2020-07-03T10:03:13.000Z | 2022-02-10T03:35:07.000Z | package GESTE_Fonts.FreeMonoOblique6pt7b is
Font : constant Bitmap_Font_Ref;
private
FreeMonoOblique6pt7bBitmaps : aliased constant Font_Bitmap := (
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#0C#, 16#08#, 16#08#, 16#08#,
16#00#, 16#00#, 16#10#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#36#,
16#24#, 16#24#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#08#, 16#14#, 16#3E#, 16#18#, 16#3C#, 16#28#, 16#28#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#0C#, 16#32#, 16#18#, 16#04#,
16#04#, 16#18#, 16#10#, 16#00#, 16#00#, 16#00#, 16#00#, 16#18#, 16#24#,
16#28#, 16#18#, 16#1E#, 16#2C#, 16#14#, 16#1C#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#0C#, 16#10#, 16#10#, 16#34#, 16#34#, 16#28#, 16#34#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#0C#, 16#08#, 16#08#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#02#,
16#04#, 16#08#, 16#08#, 16#08#, 16#08#, 16#08#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#10#, 16#10#, 16#10#, 16#10#, 16#10#, 16#10#, 16#20#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#08#, 16#1A#, 16#0C#, 16#18#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#08#, 16#08#, 16#3E#, 16#10#, 16#10#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#10#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#3E#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#18#, 16#00#, 16#00#, 16#00#,
16#00#, 16#02#, 16#02#, 16#04#, 16#08#, 16#08#, 16#10#, 16#20#, 16#20#,
16#00#, 16#00#, 16#00#, 16#00#, 16#0C#, 16#12#, 16#22#, 16#22#, 16#22#,
16#24#, 16#24#, 16#38#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#08#,
16#18#, 16#08#, 16#08#, 16#10#, 16#10#, 16#7C#, 16#00#, 16#00#, 16#00#,
16#00#, 16#0C#, 16#32#, 16#02#, 16#04#, 16#08#, 16#10#, 16#60#, 16#7C#,
16#00#, 16#00#, 16#00#, 16#00#, 16#1C#, 16#02#, 16#02#, 16#0C#, 16#04#,
16#04#, 16#44#, 16#38#, 16#00#, 16#00#, 16#00#, 16#00#, 16#04#, 16#0C#,
16#14#, 16#14#, 16#24#, 16#3C#, 16#08#, 16#1C#, 16#00#, 16#00#, 16#00#,
16#00#, 16#1E#, 16#10#, 16#20#, 16#1C#, 16#02#, 16#02#, 16#04#, 16#38#,
16#00#, 16#00#, 16#00#, 16#00#, 16#07#, 16#08#, 16#10#, 16#2C#, 16#32#,
16#22#, 16#24#, 16#18#, 16#00#, 16#00#, 16#00#, 16#00#, 16#1E#, 16#12#,
16#04#, 16#04#, 16#08#, 16#08#, 16#10#, 16#10#, 16#00#, 16#00#, 16#00#,
16#00#, 16#0C#, 16#12#, 16#22#, 16#1C#, 16#24#, 16#24#, 16#24#, 16#38#,
16#00#, 16#00#, 16#00#, 16#00#, 16#0C#, 16#12#, 16#22#, 16#22#, 16#1E#,
16#04#, 16#0C#, 16#30#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#08#, 16#00#, 16#00#, 16#00#, 16#18#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#18#, 16#00#, 16#00#, 16#10#, 16#30#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#02#, 16#0C#, 16#30#,
16#10#, 16#0C#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#3E#, 16#00#, 16#7E#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#10#, 16#08#, 16#06#, 16#0C#, 16#30#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#0E#, 16#02#, 16#04#, 16#00#,
16#00#, 16#00#, 16#18#, 16#00#, 16#00#, 16#00#, 16#00#, 16#0C#, 16#12#,
16#26#, 16#3C#, 16#34#, 16#2C#, 16#20#, 16#20#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#18#, 16#14#, 16#14#, 16#24#, 16#3C#, 16#44#, 16#E6#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#3E#, 16#22#, 16#22#, 16#3C#,
16#22#, 16#42#, 16#7C#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#1D#,
16#22#, 16#40#, 16#40#, 16#40#, 16#40#, 16#3C#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#3C#, 16#22#, 16#22#, 16#42#, 16#42#, 16#44#, 16#78#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#3E#, 16#20#, 16#20#, 16#38#,
16#28#, 16#42#, 16#7C#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#3F#,
16#20#, 16#20#, 16#38#, 16#28#, 16#40#, 16#70#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#1F#, 16#22#, 16#40#, 16#40#, 16#4E#, 16#42#, 16#3C#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#33#, 16#22#, 16#22#, 16#3C#,
16#24#, 16#44#, 16#6E#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#1E#,
16#08#, 16#08#, 16#08#, 16#10#, 16#10#, 16#7C#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#0F#, 16#02#, 16#02#, 16#04#, 16#44#, 16#44#, 16#38#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#3B#, 16#22#, 16#2C#, 16#38#,
16#44#, 16#44#, 16#66#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#3C#,
16#10#, 16#10#, 16#20#, 16#20#, 16#22#, 16#7E#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#21#, 16#33#, 16#56#, 16#5A#, 16#42#, 16#42#, 16#E6#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#23#, 16#32#, 16#32#, 16#4A#,
16#4A#, 16#4C#, 16#64#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#1C#,
16#22#, 16#42#, 16#42#, 16#42#, 16#44#, 16#38#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#3C#, 16#22#, 16#22#, 16#22#, 16#3C#, 16#40#, 16#70#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#1C#, 16#22#, 16#42#, 16#42#,
16#42#, 16#44#, 16#38#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#3E#,
16#22#, 16#22#, 16#3C#, 16#44#, 16#44#, 16#62#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#1C#, 16#22#, 16#20#, 16#1C#, 16#02#, 16#44#, 16#78#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#3F#, 16#29#, 16#08#, 16#08#,
16#10#, 16#10#, 16#38#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#33#,
16#22#, 16#22#, 16#22#, 16#22#, 16#24#, 16#38#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#73#, 16#22#, 16#22#, 16#24#, 16#28#, 16#28#, 16#10#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#33#, 16#21#, 16#5A#, 16#5A#,
16#6A#, 16#6C#, 16#44#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#33#,
16#22#, 16#14#, 16#08#, 16#38#, 16#44#, 16#66#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#33#, 16#22#, 16#14#, 16#08#, 16#10#, 16#10#, 16#3C#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#1E#, 16#22#, 16#04#, 16#18#,
16#20#, 16#44#, 16#7C#, 16#00#, 16#00#, 16#00#, 16#00#, 16#06#, 16#08#,
16#08#, 16#08#, 16#10#, 16#10#, 16#10#, 16#10#, 16#00#, 16#00#, 16#00#,
16#00#, 16#10#, 16#10#, 16#10#, 16#10#, 16#08#, 16#08#, 16#08#, 16#08#,
16#00#, 16#00#, 16#00#, 16#00#, 16#18#, 16#08#, 16#08#, 16#08#, 16#10#,
16#10#, 16#10#, 16#10#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#08#,
16#14#, 16#22#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#10#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#1C#, 16#3C#, 16#44#, 16#44#, 16#7E#, 16#00#, 16#00#, 16#00#,
16#00#, 16#20#, 16#20#, 16#20#, 16#3C#, 16#22#, 16#42#, 16#42#, 16#FC#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#1C#, 16#22#,
16#40#, 16#40#, 16#3C#, 16#00#, 16#00#, 16#00#, 16#00#, 16#02#, 16#02#,
16#02#, 16#1E#, 16#22#, 16#44#, 16#44#, 16#3A#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#1C#, 16#62#, 16#7E#, 16#40#, 16#3C#,
16#00#, 16#00#, 16#00#, 16#00#, 16#07#, 16#08#, 16#10#, 16#3E#, 16#10#,
16#10#, 16#10#, 16#7C#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#1F#, 16#22#, 16#44#, 16#44#, 16#3C#, 16#00#, 16#00#, 16#00#,
16#00#, 16#20#, 16#20#, 16#20#, 16#3C#, 16#22#, 16#42#, 16#44#, 16#6E#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#08#, 16#00#, 16#18#, 16#08#,
16#10#, 16#10#, 16#7C#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#04#,
16#00#, 16#3C#, 16#04#, 16#04#, 16#08#, 16#08#, 16#00#, 16#00#, 16#00#,
16#00#, 16#30#, 16#20#, 16#20#, 16#26#, 16#28#, 16#30#, 16#28#, 16#4E#,
16#00#, 16#00#, 16#00#, 16#00#, 16#18#, 16#08#, 16#08#, 16#08#, 16#10#,
16#10#, 16#10#, 16#7C#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#76#, 16#4A#, 16#52#, 16#52#, 16#DA#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#3C#, 16#22#, 16#42#, 16#42#, 16#66#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#1C#, 16#22#,
16#42#, 16#44#, 16#38#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#7C#, 16#22#, 16#42#, 16#22#, 16#5C#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#1F#, 16#22#, 16#42#, 16#44#, 16#3C#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#36#, 16#18#,
16#20#, 16#20#, 16#7C#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#1E#, 16#22#, 16#1C#, 16#44#, 16#78#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#10#, 16#20#, 16#3C#, 16#20#, 16#20#, 16#20#, 16#3C#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#26#, 16#24#,
16#24#, 16#24#, 16#3E#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#77#, 16#22#, 16#24#, 16#28#, 16#10#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#63#, 16#4A#, 16#4A#, 16#7C#, 16#24#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#36#, 16#24#,
16#18#, 16#34#, 16#6E#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#33#, 16#22#, 16#24#, 16#28#, 16#10#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#3E#, 16#24#, 16#18#, 16#20#, 16#7C#,
16#00#, 16#00#, 16#00#, 16#00#, 16#04#, 16#08#, 16#08#, 16#08#, 16#38#,
16#10#, 16#10#, 16#10#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#08#,
16#08#, 16#08#, 16#08#, 16#10#, 16#10#, 16#10#, 16#00#, 16#00#, 16#00#,
16#00#, 16#08#, 16#08#, 16#08#, 16#08#, 16#04#, 16#08#, 16#10#, 16#10#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#32#, 16#0C#,
16#00#, 16#00#, 16#00#);
Font_D : aliased constant Bitmap_Font :=
(
Bytes_Per_Glyph => 12,
Glyph_Width => 8,
Glyph_Height => 12,
Data => FreeMonoOblique6pt7bBitmaps'Access);
Font : constant Bitmap_Font_Ref := Font_D'Access;
end GESTE_Fonts.FreeMonoOblique6pt7b;
| 68.485915 | 73 | 0.496041 |
2ed1d75eb1396f24077f3e49ec26139fe043470e | 3,938 | ads | Ada | include/sf-window-mouse.ads | Fabien-Chouteau/ASFML | 52a013554bcfb6150e0d6391871356c1443a6b93 | [
"Zlib"
] | null | null | null | include/sf-window-mouse.ads | Fabien-Chouteau/ASFML | 52a013554bcfb6150e0d6391871356c1443a6b93 | [
"Zlib"
] | null | null | null | include/sf-window-mouse.ads | Fabien-Chouteau/ASFML | 52a013554bcfb6150e0d6391871356c1443a6b93 | [
"Zlib"
] | null | null | null |
--//////////////////////////////////////////////////////////
-- SFML - Simple and Fast Multimedia Library
-- Copyright (C) 2007-2015 Laurent Gomila ([email protected])
-- This software is provided 'as-is', without any express or implied warranty.
-- In no event will the authors be held liable for any damages arising from the use of this software.
-- Permission is granted to anyone to use this software for any purpose,
-- including commercial applications, and to alter it and redistribute it freely,
-- subject to the following restrictions:
-- 1. The origin of this software must not be misrepresented;
-- you must not claim that you wrote the original software.
-- If you use this software in a product, an acknowledgment
-- in the product documentation would be appreciated but is not required.
-- 2. Altered source versions must be plainly marked as such,
-- and must not be misrepresented as being the original software.
-- 3. This notice may not be removed or altered from any source distribution.
--//////////////////////////////////////////////////////////
--//////////////////////////////////////////////////////////
with Sf.System.Vector2;
package Sf.Window.Mouse is
--//////////////////////////////////////////////////////////
--//////////////////////////////////////////////////////////
--//////////////////////////////////////////////////////////
--/ @brief Mouse buttons
--/
--//////////////////////////////////////////////////////////
--/< The left mouse button
--/< The right mouse button
--/< The middle (wheel) mouse button
--/< The first extra mouse button
--/< The second extra mouse button
--/< Keep last -- the total number of mouse buttons
type sfMouseButton is
(sfMouseLeft,
sfMouseRight,
sfMouseMiddle,
sfMouseXButton1,
sfMouseXButton2,
sfMouseButtonCount);
--//////////////////////////////////////////////////////////
--/ @brief Mouse wheels
--/
--//////////////////////////////////////////////////////////
--/< The vertical mouse wheel
--/< The horizontal mouse wheel
type sfMouseWheel is
(sfMouseVerticalWheel,
sfMouseHorizontalWheel);
--//////////////////////////////////////////////////////////
--/ @brief Check if a mouse button is pressed
--/
--/ @param button Button to check
--/
--/ @return sfTrue if the button is pressed, sfFalse otherwise
--/
--//////////////////////////////////////////////////////////
function isButtonPressed (button : sfMouseButton) return sfBool;
--//////////////////////////////////////////////////////////
--/ @brief Get the current position of the mouse
--/
--/ This function returns the current position of the mouse
--/ cursor relative to the given window, or desktop if NULL is passed.
--/
--/ @param relativeTo Reference window
--/
--/ @return Position of the mouse cursor, relative to the given window
--/
--//////////////////////////////////////////////////////////
function getPosition (relativeTo : sfWindow_Ptr) return Sf.System.Vector2.sfVector2i;
--//////////////////////////////////////////////////////////
--/ @brief Set the current position of the mouse
--/
--/ This function sets the current position of the mouse
--/ cursor relative to the given window, or desktop if NULL is passed.
--/
--/ @param position New position of the mouse
--/ @param relativeTo Reference window
--/
--//////////////////////////////////////////////////////////
procedure setPosition (position : Sf.System.Vector2.sfVector2i; relativeTo : sfWindow_Ptr);
private
pragma Convention (C, sfMouseButton);
pragma Convention (C, sfMouseWheel);
pragma Import (C, isButtonPressed, "sfMouse_isButtonPressed");
pragma Import (C, getPosition, "sfMouse_getPosition");
pragma Import (C, setPosition, "sfMouse_setPosition");
end Sf.Window.Mouse;
| 38.607843 | 101 | 0.534281 |
2ea28244fc09cb4f1af2e9098ba6872cad56e8a9 | 23,673 | ads | Ada | tools/ayacc/src/string_scanner.ads | svn2github/matreshka | 9d222b3ad9da508855fb1f5adbe5e8a4fad4c530 | [
"BSD-3-Clause"
] | 24 | 2016-11-29T06:59:41.000Z | 2021-08-30T11:55:16.000Z | lib/ayacc/string_scanner.ads | alvaromb/Compilemon | de5f88f084705868d38e301d95bb4a19a46a1156 | [
"MIT"
] | 2 | 2019-01-16T05:15:20.000Z | 2019-02-03T10:03:32.000Z | tools/ayacc/src/string_scanner.ads | svn2github/matreshka | 9d222b3ad9da508855fb1f5adbe5e8a4fad4c530 | [
"BSD-3-Clause"
] | 4 | 2017-07-18T07:11:05.000Z | 2020-06-21T03:02:25.000Z |
-- Module : string_scanner_.ada
-- Component of : common_library
-- Version : 1.2
-- Date : 11/21/86 16:37:08
-- SCCS File : disk21~/rschm/hasee/sccs/common_library/sccs/sxstring_scanner_.ada
with String_Pkg; use String_Pkg;
package String_Scanner is
--| Functions for scanning tokens from strings.
pragma Page;
--| Overview
--| This package provides a set of functions used to scan tokens from
--| strings. After the function make_Scanner is called to convert a string
--| into a string Scanner, the following functions may be called to scan
--| various tokens from the string:
--|-
--| Make_Scanner Given a string returns a Scanner
--| Destroy_Scanner Free storage used by Scanner
--| More Return TRUE iff unscanned characters remain
--| Forward Bump the Scanner
--| Backward Bump back the Scanner
--| Get Return character
--| Next Return character and bump the Scanner
--| Get_String Return String_Type in Scanner
--| Get_Remainder Return String_Type in Scanner from current Index
--| Mark Mark the current Index for Restore
--| Restore Restore the previously marked Index
--| Position Return the current position of the Scanner
--| Is_Word Return TRUE iff Scanner is at a non-blank character
--| Scan_Word Return sequence of non blank characters
--| Is_Number Return TRUE iff Scanner is at a digit
--| Scan_Number (2) Return sequence of decimal digits
--| Is_Signed_Number Return TRUE iff Scanner is at a digit or sign
--| Scan_Signed_Number (2)
--| sequence of decimal digits with optional sign (+/-)
--| Is_Space Return TRUE iff Scanner is at a space or tab
--| Scan_Space Return sequence of spaces or tabs
--| Skip_Space Advance Scanner past white space
--| Is_Ada_Id Return TRUE iff Scanner is at first character of ada id
--| Scan_Ada_Id Scan an Ada identifier
--| Is_Quoted Return TRUE iff Scanner is at a double quote
--| Scan_Quoted Scan quoted string, embedded quotes doubled
--| Is_Enclosed Return TRUE iff Scanner is at an enclosing character
--| Scan_Enclosed Scan enclosed string, embedded enclosing character doubled
--| Is_Sequence Return TRUE iff Scanner is at some character in sequence
--| Scan_Sequence Scan user specified sequence of chars
--| Is_Not_Sequence Return TRUE iff Scanner is not at the characters in sequence
--| Scan_Not_Sequence Scan string up to but not including a given sequence of chars
--| Is_Literal Return TRUE iff Scanner is at literal
--| Scan_Literal Scan user specified literal
--| Is_Not_Literal Return TRUE iff Scanner is not a given literal
--| Scan_Not_Literal Scan string up to but not including a given literal
--|+
----------------------------------------------------------------
Out_Of_Bounds : exception; --| Raised when a operation is attempted on a
--| Scanner that has passed the end
Scanner_Already_Marked : exception;
--| Raised when a Mark is attemped on a Scanner
--| that has already been marked
----------------------------------------------------------------
type Scanner is private; --| Scanner type
----------------------------------------------------------------
pragma Page;
function Make_Scanner( --| Construct a Scanner from S.
S : in String_Type --| String to be scanned.
) return Scanner;
--| Effects: Construct a Scanner from S.
--| N/A: Raises, Modifies, Errors
----------------------------------------------------------------
procedure Destroy_Scanner( --| Free Scanner storage
T : in out Scanner --| Scanner to be freed
);
--| Effects: Free space occupied by the Scanner.
--| N/A: Raises, Modifies, Errors
----------------------------------------------------------------
function More( --| Check if Scanner is exhausted
T : in Scanner --| Scanner to check
) return boolean;
--| Effects: Return TRUE iff additional characters remain to be scanned.
--| N/A: Raises, Modifies, Errors
----------------------------------------------------------------
procedure Forward( --| Bump scanner
T : in Scanner --| Scanner
);
--| Effects: Update the scanner position.
--| N/A: Raises, Modifies, Errors
----------------------------------------------------------------
procedure Backward( --| Bump back scanner
T : in Scanner --| Scanner
);
--| Effects: Update the scanner position.
--| N/A: Raises, Modifies, Errors
----------------------------------------------------------------
function Get( --| Return character
T : in Scanner --| Scanner to check
) return character;
--| Raises: Out_Of_Bounds
--| Effects: Return character at the current Scanner position.
--| The scanner position remains unchanged.
--| N/A: Modifies, Errors
----------------------------------------------------------------
procedure Next( --| Return character and bump scanner
T : in Scanner; --| Scanner to check
C : out character --| Character to be returned
);
--| Raises: Out_Of_Bounds
--| Effects: Return character at the current Scanner position and update
--| the position.
--| N/A: Modifies, Errors
----------------------------------------------------------------
function Position( --| Return current Scanner position
T : in Scanner --| Scanner to check
) return positive;
--| Raises: Out_Of_Bounds
--| Effects: Return a positive integer indicating the current Scanner position,
--| N/A: Modifies, Errors
----------------------------------------------------------------
function Get_String( --| Return contents of Scanner
T : in Scanner --| Scanner
) return String_Type;
--| Effects: Return a String_Type corresponding to the contents of the Scanner
--| N/A: Raises, Modifies, Errors
----------------------------------------------------------------
function Get_Remainder( --| Return contents of Scanner from index
T : in Scanner
) return String_Type;
--| Effects: Return a String_Type starting at the current index of the Scanner
--| N/A: Raises, Modifies, Errors
----------------------------------------------------------------
procedure Mark(
T : in Scanner
);
--| Raises: Scanner_Already_Marked
--| Effects: Mark the current index for possible future use
--| N/A: Modifies, Errors
----------------------------------------------------------------
procedure Restore(
T : in Scanner
);
--| Effects: Restore the index to the previously marked value
--| N/A: Raises, Modifies, Errors
----------------------------------------------------------------
pragma Page;
function Is_Word( --| Check if Scanner is at the start of a word.
T : in Scanner --| Scanner to check
) return boolean;
--| Effects: Return TRUE iff Scanner is at the start of a word.
--| N/A: Raises, Modifies, Errors
----------------------------------------------------------------
procedure Scan_word( --| Scan sequence of non blank characters
T : in Scanner; --| String to be scanned
Found : out boolean; --| TRUE iff a word found
Result : out String_Type;--| Word scanned from string
Skip : in boolean := false
--| Skip white spaces before scan
);
--| Effects: Scan T for a sequence of non blank
--| characters. If at least one is found, return Found => TRUE,
--| Result => <the characters>.
--| Otherwise return Found => FALSE and Result is unpredictable.
--| N/A: Raises, Modifies, Errors
pragma Page;
function Is_Number( --| Return TRUE iff Scanner is at a decimal digit
T : in Scanner --| The string being scanned
) return boolean;
--| Effects: Return TRUE iff Scan_Number would return a non-null string.
--| N/A: Raises, Modifies, Errors
----------------------------------------------------------------
procedure Scan_Number( --| Scan sequence of digits
T : in Scanner; --| String to be scanned
Found : out boolean; --| TRUE iff one or more digits found
Result : out String_Type;--| Number scanned from string
Skip : in boolean := false
--| Skip white spaces before scan
);
--| Effects: Scan T for a sequence of digits.
--| If at least one is found, return Found => TRUE, Result => <the digits>.
--| Otherwise return Found => FALSE and Result is unpredictable.
--| Modifies: Raises, Modifies, Errors
----------------------------------------------------------------
procedure Scan_Number( --| Scan sequence of digits
T : in Scanner; --| String to be scanned
Found : out boolean; --| TRUE iff one or more digits found
Result : out integer; --| Number scanned from string
Skip : in boolean := false
--| Skip white spaces before scan
);
--| Effects: Scan T for a sequence of digits.
--| If at least one is found, return Found => TRUE, Result => <the digits>.
--| Otherwise return Found => FALSE and Result is unpredictable.
--| Modifies: Raises, Modifies, Errors
pragma Page;
function Is_Signed_Number( --| Check if Scanner is at a decimal digit or
--| sign (+/-)
T : in Scanner --| The string being scanned
) return boolean;
--| Effects: Return TRUE iff Scan_Signed_Number would return a non-null
--| string.
--| N/A: Raises, Modifies, Errors
----------------------------------------------------------------
procedure Scan_Signed_Number( --| Scan signed sequence of digits
T : in Scanner; --| String to be scanned
Found : out boolean; --| TRUE iff one or more digits found
Result : out String_Type;--| Number scanned from string
Skip : in boolean := false
--| Skip white spaces before scan
);
--| Effects: Scan T for a sequence of digits preceeded with optional sign.
--| If at least one digit is found, return Found => TRUE,
--| Result => <the digits>.
--| Otherwise return Found => FALSE and Result is unpredictable.
--| Modifies: Raises, Modifies, Errors
----------------------------------------------------------------
procedure Scan_Signed_Number( --| Scan signed sequence of digits
T : in Scanner; --| String to be scanned
Found : out boolean; --| TRUE iff one or more digits found
Result : out integer; --| Number scanned from string
Skip : in boolean := false
--| Skip white spaces before scan
);
--| Effects: Scan T for a sequence of digits preceeded with optional sign.
--| If at least one digit is found, return Found => TRUE,
--| Result => <the digits>.
--| Otherwise return Found => FALSE and Result is unpredictable.
--| Modifies: Raises, Modifies, Errors
pragma Page;
function Is_Space( --| Check if T is at a space or tab
T : in Scanner --| The string being scanned
) return boolean;
--| Effects: Return TRUE iff Scan_Space would return a non-null string.
--| Modifies: Raises, Modifies, Errors
----------------------------------------------------------------
procedure Scan_Space( --| Scan sequence of white space characters
T : in Scanner; --| String to be scanned
Found : out boolean; --| TRUE iff space found
Result : out String_Type --| Spaces scanned from string
);
--| Effects: Scan T past all white space (spaces
--| and tabs. If at least one is found, return Found => TRUE,
--| Result => <the characters>.
--| Otherwise return Found => FALSE and Result is unpredictable.
--| Modifies: Raises, Modifies, Errors
----------------------------------------------------------------
procedure Skip_Space( --| Skip white space
T : in Scanner --| String to be scanned
);
--| Effects: Scan T past all white space (spaces and tabs).
--| Modifies: Raises, Modifies, Errors
pragma Page;
function Is_Ada_Id( --| Check if T is at an Ada identifier
T : in Scanner --| The string being scanned
) return boolean;
--| Effects: Return TRUE iff Scan_Ada_Id would return a non-null string.
--| Modifies: Raises, Modifies, Errors
----------------------------------------------------------------
procedure Scan_Ada_Id( --| Scan Ada identifier
T : in Scanner; --| String to be scanned
Found : out boolean; --| TRUE iff an Ada identifier found
Result : out String_Type;--| Identifier scanned from string
Skip : in boolean := false
--| Skip white spaces before scan
);
--| Effects: Scan T for a valid Ada identifier.
--| If one is found, return Found => TRUE, Result => <the characters>.
--| Otherwise return Found => FALSE and Result is unpredictable.
--| Modifies: Raises, Modifies, Errors
pragma Page;
function Is_Quoted( --| Check if T is at a double quote
T : in Scanner --| The string being scanned
) return boolean;
--| Effects: Return TRUE iff T is at a quoted string (eg. ... "Hello" ...).
--| Modifies: Raises, Modifies, Errors
----------------------------------------------------------------
procedure Scan_Quoted( --| Scan a quoted string
T : in Scanner; --| String to be scanned
Found : out boolean; --| TRUE iff a quoted string found
Result : out String_Type;--| Quoted string scanned from string
Skip : in boolean := false
--| Skip white spaces before scan
);
--| Effects: Scan at T for an opening quote
--| followed by a sequence of characters and ending with a closing
--| quote. If successful, return Found => TRUE, Result => <the characters>.
--| Otherwise return Found => FALSE and Result is unpredictable.
--| A pair of quotes within the quoted string is converted to a single quote.
--| The outer quotes are stripped.
--| Modifies: Raises, Modifies, Errors
pragma Page;
function Is_Enclosed( --| Check if T is at an enclosing character
B : in character; --| Enclosing open character
E : in character; --| Enclosing close character
T : in Scanner --| The string being scanned
) return boolean;
--| Effects: Return TRUE iff T as encosed by B and E (eg. ... [ABC] ...).
--| Modifies: Raises, Modifies, Errors
----------------------------------------------------------------
procedure Scan_Enclosed( --| Scan an enclosed string
B : in character; --| Enclosing open character
E : in character; --| Enclosing close character
T : in Scanner; --| String to be scanned
Found : out boolean; --| TRUE iff a quoted string found
Result : out String_Type;--| Quoted string scanned from string
Skip : in boolean := false
--| Skip white spaces before scan
);
--| Effects: Scan at T for an enclosing character
--| followed by a sequence of characters and ending with an enclosing character.
--| If successful, return Found => TRUE, Result => <the characters>.
--| Otherwise return Found => FALSE and Result is unpredictable.
--| The enclosing characters are stripped.
--| Modifies: Raises, Modifies, Errors
pragma Page;
function Is_Sequence( --| Check if T is at some sequence characters
Chars : in String_Type; --| Characters to be scanned
T : in Scanner --| The string being scanned
) return boolean;
--| Effects: Return TRUE iff T is at some character of Chars.
--| Modifies: Raises, Modifies, Errors
----------------------------------------------------------------
function Is_Sequence( --| Check if T is at some sequence characters
Chars : in string; --| Characters to be scanned
T : in Scanner --| The string being scanned
) return boolean;
--| Effects: Return TRUE iff T is at some character of Chars.
--| Modifies: Raises, Modifies, Errors
----------------------------------------------------------------
procedure Scan_Sequence( --| Scan arbitrary sequence of characters
Chars : in String_Type;--| Characters that should be scanned
T : in Scanner; --| String to be scanned
Found : out boolean; --| TRUE iff a sequence found
Result : out String_Type;--| Sequence scanned from string
Skip : in boolean := false
--| Skip white spaces before scan
);
--| Effects: Scan T for a sequence of characters C such that C appears in
--| Char. If at least one is found, return Found => TRUE,
--| Result => <the characters>.
--| Otherwise return Found => FALSE and Result is unpredictable.
--| Modifies: Raises, Modifies, Errors
--| Notes:
--| Scan_Sequence("0123456789", S, Index, Found, Result)
--| is equivalent to Scan_Number(S, Index, Found, Result)
--| but is less efficient.
----------------------------------------------------------------
procedure Scan_Sequence( --| Scan arbitrary sequence of characters
Chars : in string; --| Characters that should be scanned
T : in Scanner; --| String to be scanned
Found : out boolean; --| TRUE iff a sequence found
Result : out String_Type;--| Sequence scanned from string
Skip : in boolean := false
--| Skip white spaces before scan
);
--| Effects: Scan T for a sequence of characters C such that C appears in
--| Char. If at least one is found, return Found => TRUE,
--| Result => <the characters>.
--| Otherwise return Found => FALSE and Result is unpredictable.
--| Modifies: Raises, Modifies, Errors
--| Notes:
--| Scan_Sequence("0123456789", S, Index, Found, Result)
--| is equivalent to Scan_Number(S, Index, Found, Result)
--| but is less efficient.
pragma Page;
function Is_Not_Sequence( --| Check if T is not at some seuqnce of character
Chars : in String_Type; --| Characters to be scanned
T : in Scanner --| The string being scanned
) return boolean;
--| Effects: Return TRUE iff T is not at some character of Chars.
--| Modifies: Raises, Modifies, Errors
----------------------------------------------------------------
function Is_Not_Sequence( --| Check if T is at some sequence of characters
Chars : in string; --| Characters to be scanned
T : in Scanner --| The string being scanned
) return boolean;
--| Effects: Return TRUE iff T is not at some character of Chars.
--| Modifies: Raises, Modifies, Errors
----------------------------------------------------------------
procedure Scan_Not_Sequence( --| Scan arbitrary sequence of characters
Chars : in String_Type;--| Characters that should be scanned
T : in Scanner; --| String to be scanned
Found : out boolean; --| TRUE iff a sequence found
Result : out String_Type;--| Sequence scanned from string
Skip : in boolean := false
--| Skip white spaces before scan
);
--| Effects: Scan T for a sequence of characters C such that C does not appear
--| in Chars. If at least one such C is found, return Found => TRUE,
--| Result => <the characters>.
--| Otherwise return Found => FALSE and Result is unpredictable.
--| Modifies: Raises, Modifies, Errors
----------------------------------------------------------------
procedure Scan_Not_Sequence( --| Scan arbitrary sequence of characters
Chars : in string; --| Characters that should be scanned
T : in Scanner; --| String to be scanned
Found : out boolean; --| TRUE iff a sequence found
Result : out String_Type;--| Sequence scanned from string
Skip : in boolean := false
--| Skip white spaces before scan
);
--| Effects: Scan T for a sequence of characters C such that C does not appear
--| in Chars. If at least one such C is found, return Found => TRUE,
--| Result => <the characters>.
--| Otherwise return Found => FALSE and Result is unpredictable.
--| Modifies: Raises, Modifies, Errors
pragma Page;
function Is_Literal( --| Check if T is at literal Chars
Chars : in String_Type; --| Characters to be scanned
T : in Scanner --| The string being scanned
) return boolean;
--| Effects: Return TRUE iff T is at literal Chars.
--| Modifies: Raises, Modifies, Errors
----------------------------------------------------------------
function Is_Literal( --| Check if T is at literal Chars
Chars : in string; --| Characters to be scanned
T : in Scanner --| The string being scanned
) return boolean;
--| Effects: Return TRUE iff T is at literal Chars.
--| Modifies: Raises, Modifies, Errors
----------------------------------------------------------------
procedure Scan_Literal( --| Scan arbitrary literal
Chars : in String_Type;--| Literal that should be scanned
T : in Scanner; --| String to be scanned
Found : out boolean; --| TRUE iff a sequence found
Skip : in boolean := false
--| Skip white spaces before scan
);
--| Effects: Scan T for a litral Chars such that Char matches the sequence
--| of characters in T. If found, return Found => TRUE,
--| Otherwise return Found => FALSE
--| Modifies: Raises, Modifies, Errors
----------------------------------------------------------------
procedure Scan_Literal( --| Scan arbitrary literal
Chars : in string; --| Literal that should be scanned
T : in Scanner; --| String to be scanned
Found : out boolean; --| TRUE iff a sequence found
Skip : in boolean := false
--| Skip white spaces before scan
);
--| Effects: Scan T for a litral Chars such that Char matches the sequence
--| of characters in T. If found, return Found => TRUE,
--| Otherwise return Found => FALSE
--| Modifies: Raises, Modifies, Errors
pragma Page;
function Is_Not_Literal( --| Check if T is not at literal Chars
Chars : in string; --| Characters to be scanned
T : in Scanner --| The string being scanned
) return boolean;
--| Effects: Return TRUE iff T is not at literal Chars
--| Modifies: Raises, Modifies, Errors
----------------------------------------------------------------
function Is_Not_Literal( --| Check if T is not at literal Chars
Chars : in String_Type; --| Characters to be scanned
T : in Scanner --| The string being scanned
) return boolean;
--| Effects: Return TRUE iff T is not at literal Chars
--| Modifies: Raises, Modifies, Errors
----------------------------------------------------------------
procedure Scan_Not_Literal( --| Scan arbitrary literal
Chars : in string; --| Literal that should be scanned
T : in Scanner; --| String to be scanned
Found : out boolean; --| TRUE iff a sequence found
Result : out String_Type;--| String up to literal
Skip : in boolean := false
--| Skip white spaces before scan
);
--| Effects: Scan T for a litral Chars such that Char does not match the
--| sequence of characters in T. If found, return Found => TRUE,
--| Otherwise return Found => FALSE
--| Modifies: Raises, Modifies, Errors
----------------------------------------------------------------
procedure Scan_Not_Literal( --| Scan arbitrary literal
Chars : in String_Type;--| Literal that should be scanned
T : in Scanner; --| String to be scanned
Found : out boolean; --| TRUE iff a sequence found
Result : out String_Type;--| String up to literal
Skip : in boolean := false
--| Skip white spaces before scan
);
--| Effects: Scan T for a litral Chars such that Char does not match the
--| sequence of characters in T. If found, return Found => TRUE,
--| Otherwise return Found => FALSE
--| Modifies: Raises, Modifies, Errors
pragma Page;
private
pragma List(off);
type Scan_Record is
record
text : String_Type; --| Copy of string being scanned
index : positive := 1; --| Current position of Scanner
mark : natural := 0; --| Mark
end record;
type Scanner is access Scan_Record;
pragma List(on);
end String_Scanner;
pragma Page;
| 37.163265 | 84 | 0.601065 |
047bacac570b57df3facecde183b9a5a6874ccc0 | 8,350 | ads | Ada | gcc-gcc-7_3_0-release/gcc/ada/s-ficobl.ads | best08618/asylo | 5a520a9f5c461ede0f32acc284017b737a43898c | [
"Apache-2.0"
] | 7 | 2020-05-02T17:34:05.000Z | 2021-10-17T10:15:18.000Z | gcc-gcc-7_3_0-release/gcc/ada/s-ficobl.ads | best08618/asylo | 5a520a9f5c461ede0f32acc284017b737a43898c | [
"Apache-2.0"
] | null | null | null | gcc-gcc-7_3_0-release/gcc/ada/s-ficobl.ads | best08618/asylo | 5a520a9f5c461ede0f32acc284017b737a43898c | [
"Apache-2.0"
] | 2 | 2020-07-27T00:22:36.000Z | 2021-04-01T09:41:02.000Z | ------------------------------------------------------------------------------
-- --
-- GNAT RUN-TIME COMPONENTS --
-- --
-- S Y S T E M . F I L E _ C O N T R O L _ B L O C K --
-- --
-- S p e c --
-- --
-- Copyright (C) 1992-2014, Free Software Foundation, Inc. --
-- --
-- GNAT is free software; you can redistribute it and/or modify it under --
-- terms of the GNU General Public License as published by the Free Soft- --
-- ware Foundation; either version 3, or (at your option) any later ver- --
-- sion. GNAT is distributed in the hope that it will be useful, but WITH- --
-- OUT ANY WARRANTY; without even the implied warranty of MERCHANTABILITY --
-- or FITNESS FOR A PARTICULAR PURPOSE. --
-- --
-- As a special exception under Section 7 of GPL version 3, you are granted --
-- additional permissions described in the GCC Runtime Library Exception, --
-- version 3.1, as published by the Free Software Foundation. --
-- --
-- You should have received a copy of the GNU General Public License and --
-- a copy of the GCC Runtime Library Exception along with this program; --
-- see the files COPYING3 and COPYING.RUNTIME respectively. If not, see --
-- <http://www.gnu.org/licenses/>. --
-- --
-- GNAT was originally developed by the GNAT team at New York University. --
-- Extensive contributions were provided by Ada Core Technologies Inc. --
-- --
------------------------------------------------------------------------------
-- This package contains the declaration of the basic file control block
-- shared between Text_IO, Sequential_IO, Direct_IO and Streams.Stream_IO.
-- The actual control blocks are derived from this block by extension. The
-- control block is itself derived from Ada.Streams.Root_Stream_Type which
-- facilitates implementation of Stream_IO.Stream and Text_Streams.Stream.
with Ada.Streams;
with Interfaces.C_Streams;
with System.CRTL;
package System.File_Control_Block is
pragma Preelaborate;
----------------------------
-- Ada File Control Block --
----------------------------
-- The Ada file control block is an abstract extension of the root
-- stream type. This allows a file to be treated directly as a stream
-- for the purposes of Stream_IO, or stream operations on a text file.
-- The individual I/O packages extend this type with package specific
-- fields to create the concrete types to which the routines in this
-- package can be applied.
-- The type File_Type in the individual packages is an access to the
-- extended file control block. The value is null if the file is not
-- open, and a pointer to the control block if the file is open.
type Pstring is access all String;
-- Used to hold name and form strings
type File_Mode is (In_File, Inout_File, Out_File, Append_File);
subtype Read_File_Mode is File_Mode range In_File .. Inout_File;
-- File mode (union of file modes permitted by individual packages,
-- the types File_Mode in the individual packages are declared to
-- allow easy conversion to and from this general type.
type Shared_Status_Type is (Yes, No, None);
-- This type is used to define the sharing status of a file. The default
-- setting of None is used if no "shared=xxx" appears in the form string
-- when a file is created or opened. For a file with Shared_Status set to
-- None, Use_Error will be raised if any other file is opened or created
-- with the same full name. Yes/No are set in response to the presence
-- of "shared=yes" or "shared=no" in the form string. In either case it
-- is permissible to have multiple files opened with the same full name.
-- All files opened simultaneously with "shared=yes" will share the same
-- stream with the semantics specified in the RM for file sharing. All
-- files opened with "shared=no" will have their own stream.
type AFCB is tagged;
type AFCB_Ptr is access all AFCB'Class;
type AFCB is abstract new Ada.Streams.Root_Stream_Type with record
Stream : Interfaces.C_Streams.FILEs;
-- The file descriptor
Name : Pstring;
-- A pointer to the file name. The file name is null for temporary
-- files, and also for standard files (stdin, stdout, stderr). The
-- name is always null-terminated if it is non-null.
Encoding : System.CRTL.Filename_Encoding;
-- Encoding used to specified the filename
Form : Pstring;
-- A pointer to the form string. This is the string used in the
-- fopen call, and must be supplied by the caller (there are no
-- defaults at this level). The string is always null-terminated.
Mode : File_Mode;
-- The file mode. No checks are made that the mode is consistent
-- with the form used to fopen the file.
Is_Regular_File : Boolean;
-- A flag indicating if the file is a regular file
Is_Temporary_File : Boolean;
-- A flag set only for temporary files (i.e. files created using the
-- Create function with a null name parameter, using tmpfile). This
-- is currently not used since temporary files are deleted by the
-- operating system, but it is set properly in case some systems
-- need this information in the future.
Is_System_File : Boolean;
-- A flag set only for system files (stdin, stdout, stderr)
Text_Encoding : Interfaces.C_Streams.Content_Encoding;
-- A flag set to describe file content encoding
Shared_Status : Shared_Status_Type;
-- Indicates sharing status of file, see description of type above
Access_Method : Character;
-- Set to 'Q', 'S', 'T', 'D' for Sequential_IO, Stream_IO, Text_IO,
-- Direct_IO file (used to validate file sharing request).
Next : AFCB_Ptr;
Prev : AFCB_Ptr;
-- All open files are kept on a doubly linked chain, with these
-- pointers used to maintain the next and previous pointers.
end record;
----------------------------------
-- Primitive Operations of AFCB --
----------------------------------
-- Note that we inherit the abstract operations Read and Write from
-- the base type. These must be overridden by the individual file
-- access methods to provide Stream Read/Write access.
function AFCB_Allocate (Control_Block : AFCB) return AFCB_Ptr is abstract;
-- Given a control block, allocate space for a control block of the same
-- type on the heap, and return the pointer to this allocated block. Note
-- that the argument Control_Block is not used other than as the argument
-- that controls which version of AFCB_Allocate is called.
procedure AFCB_Close (File : not null access AFCB) is abstract;
-- Performs any specialized close actions on a file before the file is
-- actually closed at the system level. This is called by Close, and
-- the reason we need the primitive operation is for the automatic
-- close operations done as part of finalization.
procedure AFCB_Free (File : not null access AFCB) is abstract;
-- Frees the AFCB referenced by the given parameter. It is not necessary
-- to free the strings referenced by the Form and Name fields, but if the
-- extension has any other heap objects, they must be freed as well. This
-- procedure must be overridden by each individual file package.
end System.File_Control_Block;
| 51.226994 | 78 | 0.601916 |
2e89674d820ca207f1a3034a8072eb24bc7fb1aa | 1,739 | ads | Ada | tier-1/xcb/source/thin/xcb-xcb_glx_get_mapiv_reply_t.ads | charlie5/cBound | 741be08197a61ad9c72553e3302f3b669902216d | [
"0BSD"
] | 2 | 2015-11-12T11:16:20.000Z | 2021-08-24T22:32:04.000Z | tier-1/xcb/source/thin/xcb-xcb_glx_get_mapiv_reply_t.ads | charlie5/cBound | 741be08197a61ad9c72553e3302f3b669902216d | [
"0BSD"
] | 1 | 2018-06-05T05:19:35.000Z | 2021-11-20T01:13:23.000Z | tier-1/xcb/source/thin/xcb-xcb_glx_get_mapiv_reply_t.ads | charlie5/cBound | 741be08197a61ad9c72553e3302f3b669902216d | [
"0BSD"
] | null | null | null | -- This file is generated by SWIG. Please do not modify by hand.
--
with Interfaces;
with swig;
with Interfaces.C;
with Interfaces.C.Pointers;
package xcb.xcb_glx_get_mapiv_reply_t is
-- Item
--
type Item is record
response_type : aliased Interfaces.Unsigned_8;
pad0 : aliased Interfaces.Unsigned_8;
sequence : aliased Interfaces.Unsigned_16;
length : aliased Interfaces.Unsigned_32;
pad1 : aliased swig.int8_t_Array (0 .. 3);
n : aliased Interfaces.Unsigned_32;
datum : aliased Interfaces.Integer_32;
pad2 : aliased swig.int8_t_Array (0 .. 11);
end record;
-- Item_Array
--
type Item_Array is
array
(Interfaces.C.size_t range <>) of aliased xcb.xcb_glx_get_mapiv_reply_t
.Item;
-- Pointer
--
package C_Pointers is new Interfaces.C.Pointers
(Index => Interfaces.C.size_t,
Element => xcb.xcb_glx_get_mapiv_reply_t.Item,
Element_Array => xcb.xcb_glx_get_mapiv_reply_t.Item_Array,
Default_Terminator => (others => <>));
subtype Pointer is C_Pointers.Pointer;
-- Pointer_Array
--
type Pointer_Array is
array
(Interfaces.C.size_t range <>) of aliased xcb.xcb_glx_get_mapiv_reply_t
.Pointer;
-- Pointer_Pointer
--
package C_Pointer_Pointers is new Interfaces.C.Pointers
(Index => Interfaces.C.size_t,
Element => xcb.xcb_glx_get_mapiv_reply_t.Pointer,
Element_Array => xcb.xcb_glx_get_mapiv_reply_t.Pointer_Array,
Default_Terminator => null);
subtype Pointer_Pointer is C_Pointer_Pointers.Pointer;
end xcb.xcb_glx_get_mapiv_reply_t;
| 29.474576 | 78 | 0.651524 |
2ebfa3ff8eb8b3d38cc3742acabf85c52a6b67e6 | 12,539 | adb | Ada | alog/src/alog.adb | btmalone/alog | 164a0a3e82aee414dc6125b64cd8ccc3a01876f9 | [
"Apache-2.0"
] | null | null | null | alog/src/alog.adb | btmalone/alog | 164a0a3e82aee414dc6125b64cd8ccc3a01876f9 | [
"Apache-2.0"
] | 3 | 2018-12-23T03:07:49.000Z | 2019-06-03T20:16:30.000Z | alog/src/alog.adb | btmalone/alog | 164a0a3e82aee414dc6125b64cd8ccc3a01876f9 | [
"Apache-2.0"
] | null | null | null | ------------------------------------------------------------------------
--
-- Copyright (c) 2018, Brendan T Malone All Rights Reserved.
--
-- Licensed under the Apache License, Version 2.0 (the "License");
-- you may not use this file except in compliance with the License.
-- You may obtain a copy of the License at
--
-- http://www.apache.org/licenses/LICENSE-2.0
--
-- Unless required by applicable law or agreed to in writing, software
-- distributed under the License is distributed on an "AS IS" BASIS,
-- WITHOUT WARRANTIES OR CONDITIONS OF ANY KIND, either express or implied.
-- See the License for the specific language governing permissions and
-- limitations under the License.
--
------------------------------------------------------------------------
------------------------------------------------------------------------
--
-- Ada support for leveled logs. Based on Google's glog
--
-- TODO Usage Stuff
--
------------------------------------------------------------------------
with Ada.Calendar;
with Ada.Calendar.Formatting;
with Ada.Command_Line;
with Ada.Environment_Variables;
with Ada.Text_IO;
with Ada.Strings.Unbounded;
with GNAT.Sockets;
package body Alog is
package AC renames Ada.Calendar;
package ACF renames Ada.Calendar.Formatting;
package ACL renames Ada.Command_Line;
package TIO renames Ada.Text_IO;
package AEV renames Ada.Environment_Variables;
---------------------------------------------------------------------
-- Private method declarations
---------------------------------------------------------------------
procedure Create_Files;
function Format_Output (Lvl : Level; Msg : String) return String;
procedure Output (Lvl : Level; Msg : String);
procedure Output_Stdout (Lvl : Level; Msg : String);
procedure Output_File (Lvl : Level; Msg : String);
---------------------------------------------------------------------
-- Import C menthods
---------------------------------------------------------------------
-- Import getpid so that we can have the log files name be distinct
-- per process.
function Get_PID return Integer;
pragma Import
(Convention => C,
Entity => Get_PID,
External_Name => "getpid");
---------------------------------------------------------------------
-- Package variables
---------------------------------------------------------------------
-- By default only log to the console if the log message is an Error
-- or greater.
Stdout_Threshold : Level := ERROR;
-- Defeault Vlog level is one.
Vlog_Threshold : Natural := 1;
-- By default write both to the log files and the console.
Log_Location : LogTo := BOTH;
-- By default write all log files to the tmp directory.
File_Location : ASU.Unbounded_String;
-- Array of a file handler for each log level.
type Log_Files is array (Level) of TIO.File_Type;
Files : Log_Files;
-- Mutex so the log can be multithreaded.
protected type Mutex is
entry Seize;
procedure Release;
private
Owned : Boolean := False;
end Mutex;
protected body Mutex is
entry Seize when not Owned is
begin
Owned := True;
end Seize;
procedure Release is
begin
Owned := False;
end Release;
end Mutex;
-- Instance of the lock.
Lock : Mutex;
function Equivalent_Strings (Left, Right : ASU.Unbounded_String)
return Boolean is
use ASU;
begin
return Left = Right;
end Equivalent_Strings;
---------------------------------------------------------------------
-- Private method
---------------------------------------------------------------------
-- Create the log file in the form of:
-- <program name>.<host>.<user>.log.<LEVEL>.<time>.<pid>
-- in the defined file location.
procedure Create_Files is
Cmd : constant String := Program_Name (ACL.Command_Name);
Host : constant String := GNAT.Sockets.Host_Name;
User : constant String := AEV.Value ("USER");
Time : constant String := Program_Time (ACF.Image (AC.Clock));
Pid : constant String := Integer'Image (Get_PID);
Prefix : constant String := Cmd & "." &
Host & "." & User & ".log.";
Suffix : constant String := "." & Time & "." &
(Pid (Pid'First + 1 .. Pid'Last));
begin
if not Files_Location_Set then
File_Location := ASU.To_Unbounded_String ("/tmp/");
end if;
for Lvl in Files'Range loop
begin
TIO.Create (File => Files (Lvl),
Mode => TIO.Out_File,
Name => ASU.To_String (File_Location) &
Prefix & Level'Image (Lvl) & Suffix);
exception
when others =>
raise Program_Error with "UNABLE TO CREATE LOGS";
end;
end loop;
Files_Created := True;
end Create_Files;
-- Take the time the program was run and create a file friendly
-- representation of the string.
-- e.g 2018-12-01 08:08:20 -> 20181201.080820
function Program_Time (Time : String) return String is
Str : String (1 .. 15);
Pos : Natural := Str'First;
begin
for i in Time'Range loop
case Time (i) is
when '-' =>
null;
when ':' =>
null;
when ' ' =>
Str (Pos) := '.';
Pos := Pos + 1;
when others =>
Str (Pos) := Time (i);
Pos := Pos + 1;
end case;
end loop;
return Str;
end Program_Time;
-- Take the time the command name and remove all the dots and slashes
-- so the program name can be used in the log file name.
function Program_Name (Cmd : String) return String is
Pos : Integer := 0;
begin
for i in Cmd'Range loop
-- Go backwards through the string till a / is found
if Cmd (Cmd'Last - i) = '/' then
Pos := i;
exit;
end if;
end loop;
return (Cmd (Cmd'Last - Pos + 1 .. Cmd'Last));
end Program_Name;
-- Method to format the log message for both the console and file.
function Format_Output (Lvl : Level; Msg : String) return String is
begin
return ACF.Image (AC.Clock) & " " & Level'Image (Lvl) & " " & Msg;
end Format_Output;
-- Output the log message to the console if it is at or above the log
-- threshold.
procedure Output_Stdout (Lvl : Level; Msg : String) is
begin
-- Only output to StdOut if the level of the message is
-- higher than the threshold.
if Lvl >= Stdout_Threshold then
TIO.Put_Line (Format_Output (Lvl, Msg));
end if;
end Output_Stdout;
-- Output the log message to the files.
procedure Output_File (Lvl : Level; Msg : String) is
begin
-- Create the files if this is the first call.
if not Files_Created then
Create_Files;
end if;
-- Start at INFO log and add the Msg then step up to the
-- next log checking everytime if you are now above
-- your amount.
for i in Level'Range loop
if i <= Lvl then
TIO.Put_Line (Files (i), Format_Output (Lvl, Msg));
Stats (i).Lines := Stats (i).Lines + 1;
end if;
end loop;
-- If the message recieved is FATAL throw a error to
-- terminate the program.
if Lvl = FATAL then
raise Program_Error with "FATAL ERROR OCCURED";
end if;
end Output_File;
-- Common output method that logs based on the log location.
-- Lock surrounding.
procedure Output (Lvl : Level; Msg : String) is
begin
Lock.Seize;
case Log_Location is
when NONE =>
null;
when STDOUT =>
Output_Stdout (Lvl, Msg);
when FILE =>
Output_File (Lvl, Msg);
when BOTH =>
Output_Stdout (Lvl, Msg);
Output_File (Lvl, Msg);
end case;
Lock.Release;
end Output;
procedure Vmodule_Setup (Mods : String) is
First : Natural := Mods'First;
Equal_Pos : Natural;
Failed : Boolean := True;
Module : ASU.Unbounded_String;
Temp : ASU.Unbounded_String;
Value : Natural;
begin
for i in Mods'Range loop
case Mods (i) is
when '=' =>
-- Saw an equal sign so the string was okay.
-- If something else is messed up it will throw an error
Failed := False;
Equal_Pos := i;
Module := ASU.To_Unbounded_String (Mods (First .. (i - 1)));
when ',' =>
Temp := ASU.To_Unbounded_String
(Mods ((Equal_Pos + 1) .. (i - 1)));
Value := Natural'Value (ASU.To_String (Temp));
Modules_Map.Insert (Module, Value);
First := i + 1;
when others =>
null;
end case;
end loop;
-- Add the last module and number here since the loop broke.
Temp := ASU.To_Unbounded_String (Mods ((Equal_Pos + 1) .. Mods'Last));
Value := Natural'Value (ASU.To_String (Temp));
Modules_Map.Insert (Module, Value);
if Failed then
raise Program_Error with "VMODULE STRING INCORRECT";
end if;
end Vmodule_Setup;
function Format_Module (Source : String) return String is
Temp : ASU.Unbounded_String;
begin
for i in Source'Range loop
case Source (i) is
when '.' =>
Temp := ASU.To_Unbounded_String
(Source (Source'First .. (i - 1)));
when others =>
null;
end case;
end loop;
return ASU.To_String (Temp);
end Format_Module;
---------------------------------------------------------------------
-- Public methods
---------------------------------------------------------------------
---------------------------------------------------------------------
-- Logging
---------------------------------------------------------------------
procedure Info (Msg : String) is
begin
Output (INFO, Msg);
end Info;
procedure Warn (Msg : String) is
begin
Output (WARN, Msg);
end Warn;
procedure Error (Msg : String) is
begin
Output (ERROR, Msg);
end Error;
procedure Fatal (Msg : String) is
begin
Output (FATAL, Msg);
end Fatal;
procedure Vlog (Lvl : Natural;
Msg : String;
Source : String := GNAT.Source_Info.Source_Location) is
Temp : ASU.Unbounded_String;
begin
if Modules_Map.Is_Empty then
if Lvl <= Vlog_Threshold then
TIO.Put_Line (Format_Output (INFO, Source & " " & Msg));
end if;
else
Temp := ASU.To_Unbounded_String (Format_Module (Source));
if Lvl <= Modules_Map.Element (Temp) then
TIO.Put_Line (Format_Output (INFO, Source & " " & Msg));
end if;
end if;
exception
when others =>
null;
end Vlog;
---------------------------------------------------------------------
-- Configuration
---------------------------------------------------------------------
procedure Set_LogTo (Output : LogTo) is
begin
Log_Location := Output;
end Set_LogTo;
procedure Set_LogTo (Output : String) is
begin
Set_LogTo (LogTo'Value (Output));
end Set_LogTo;
procedure Set_Stdout_Threshold (Lvl : Level) is
begin
Stdout_Threshold := Lvl;
end Set_Stdout_Threshold;
procedure Set_Stdout_Threshold (Lvl : String) is
begin
Set_Stdout_Threshold (Level'Value (Lvl));
end Set_Stdout_Threshold;
procedure Set_File_Path (Path : String) is
begin
File_Location := ASU.To_Unbounded_String (Path);
Files_Location_Set := True;
end Set_File_Path;
procedure Set_Vlog_Threshold (Lvl : Natural) is
begin
Vlog_Threshold := Lvl;
end Set_Vlog_Threshold;
procedure Set_Vlog_Modules (Mods : String) is
begin
Vmodule_Setup (Mods);
end Set_Vlog_Modules;
---------------------------------------------------------------------
-- Statistics
---------------------------------------------------------------------
function Lines (Lvl : Level) return Natural is
begin
return Stats (Lvl).Lines;
end Lines;
end Alog;
| 31.191542 | 76 | 0.523566 |
38221672f40cd04eb0704bd7fe6442ffa82782b4 | 2,342 | adb | Ada | PIM/TP2_Raffinage/deviner_nombre.adb | Hathoute/ENSEEIHT | d42f0b0dedb269e6df3b1c006d4d45e52fc518b8 | [
"MIT"
] | 1 | 2021-06-26T21:51:11.000Z | 2021-06-26T21:51:11.000Z | PIM/TP2_Raffinage/deviner_nombre.adb | Hathoute/ENSEEIHT | d42f0b0dedb269e6df3b1c006d4d45e52fc518b8 | [
"MIT"
] | null | null | null | PIM/TP2_Raffinage/deviner_nombre.adb | Hathoute/ENSEEIHT | d42f0b0dedb269e6df3b1c006d4d45e52fc518b8 | [
"MIT"
] | null | null | null | -- Auteurs :
-- Equipe :
-- Mini-projet 1 : Le jeu du devin
with Ada.Text_Io; use Ada.Text_Io;
with Ada.Integer_Text_Io; use Ada.Integer_Text_Io;
-- Deviner le nombre de l'utilisateur en interagissant avec lui.
procedure Deviner_Nombre is
--! declarations des variables du programme principal
BorneMin: Integer; -- la borne minimale.
BorneMax: Integer; -- la borne maximale.
Nombre: Integer; -- le nombre que l'ordinateur devine
Essaies: Integer; -- le nombre d'essaies
Choix: Character; -- le choix de l'utilisateur
begin
-- Demander à l'utilisateur de deviner le nombre.
loop
Put("Avez-vous choisi un nombre compris entre 1 et 999 (o/n) ? ");
Get(Choix);
if Choix = 'n' then
Put_Line("J'attends...");
end if;
exit when Choix = 'o';
end loop;
-- Initialiser les variables
BorneMin := 1;
BorneMax := 999;
Nombre := 500;
Essaies := 0;
-- Chercher le nombre deviné
loop
-- Mettre à jour les variables
if Choix = 'g' then
BorneMax := Nombre - 1;
elsif Choix = 'p' then
BorneMin := Nombre + 1;
end if;
-- Verifier si l'utilisateur ne triche pas
if BorneMax < BorneMin then
Put_Line("Vous trichez. J'arrête cette partie.");
return;
end if;
-- Calculer le nombre
Nombre := (BorneMin + BorneMax)/2; -- Valeur médiane
-- Incrementer les essaies
Essaies := Essaies + 1;
-- Afficher la proposition
Put ("Je propose ");
Put (Item => Nombre, Width => 1);
Put_Line("");
-- Saisir l'indice
loop
Put("Votre indice (t/p/g) ? ");
Get(Choix);
exit when Choix = 't' or Choix = 'p' or Choix = 'g';
end loop;
exit when Choix = 't';
end loop;
-- Afficher le nombre trouvé
Put ("J'ai trouvé ");
Put (Item => Nombre, Width => 1);
Put(" en ");
Put (Item => Essaies, Width => 1);
Put(" essai(s).");
end Deviner_Nombre;
| 30.815789 | 72 | 0.500427 |
1e274060939fe9d46450088549ee53bf89aca63f | 427,917 | adb | Ada | HLS/lab3/dct.prj/solution5/.autopilot/db/dct_2d.adb | lfVelez/ISPR | 840f41c2053a48642a7b287feecfea79c6f389b3 | [
"MIT"
] | 1 | 2021-03-03T16:53:52.000Z | 2021-03-03T16:53:52.000Z | HLS/lab3/dct.prj/solution5/.autopilot/db/dct_2d.adb | lfVelez/ISPR | 840f41c2053a48642a7b287feecfea79c6f389b3 | [
"MIT"
] | null | null | null | HLS/lab3/dct.prj/solution5/.autopilot/db/dct_2d.adb | lfVelez/ISPR | 840f41c2053a48642a7b287feecfea79c6f389b3 | [
"MIT"
] | null | null | null | <?xml version="1.0" encoding="UTF-8" standalone="yes" ?>
<!DOCTYPE boost_serialization>
<boost_serialization signature="serialization::archive" version="14">
<syndb class_id="0" tracking_level="0" version="0">
<userIPLatency>-1</userIPLatency>
<userIPName/>
<cdfg class_id="1" tracking_level="1" version="0" object_id="_0">
<name>dct_2d</name>
<ret_bitwidth>0</ret_bitwidth>
<ports class_id="2" tracking_level="0" version="0">
<count>9</count>
<item_version>0</item_version>
<item class_id="3" tracking_level="1" version="0" object_id="_1">
<Value class_id="4" tracking_level="0" version="0">
<Obj class_id="5" tracking_level="0" version="0">
<type>1</type>
<id>1</id>
<name>in_block_0</name>
<fileName/>
<fileDirectory/>
<lineNumber>0</lineNumber>
<contextFuncName/>
<inlineStackInfo class_id="6" tracking_level="0" version="0">
<count>0</count>
<item_version>0</item_version>
</inlineStackInfo>
<originalName>in_block[0]</originalName>
<rtlName/>
<coreName>RAM</coreName>
</Obj>
<bitwidth>16</bitwidth>
</Value>
<direction>0</direction>
<if_type>1</if_type>
<array_size>8</array_size>
<bit_vecs class_id="7" tracking_level="0" version="0">
<count>0</count>
<item_version>0</item_version>
</bit_vecs>
</item>
<item class_id_reference="3" object_id="_2">
<Value>
<Obj>
<type>1</type>
<id>2</id>
<name>in_block_1</name>
<fileName/>
<fileDirectory/>
<lineNumber>0</lineNumber>
<contextFuncName/>
<inlineStackInfo>
<count>0</count>
<item_version>0</item_version>
</inlineStackInfo>
<originalName>in_block[1]</originalName>
<rtlName/>
<coreName>RAM</coreName>
</Obj>
<bitwidth>16</bitwidth>
</Value>
<direction>0</direction>
<if_type>1</if_type>
<array_size>8</array_size>
<bit_vecs>
<count>0</count>
<item_version>0</item_version>
</bit_vecs>
</item>
<item class_id_reference="3" object_id="_3">
<Value>
<Obj>
<type>1</type>
<id>3</id>
<name>in_block_2</name>
<fileName/>
<fileDirectory/>
<lineNumber>0</lineNumber>
<contextFuncName/>
<inlineStackInfo>
<count>0</count>
<item_version>0</item_version>
</inlineStackInfo>
<originalName>in_block[2]</originalName>
<rtlName/>
<coreName>RAM</coreName>
</Obj>
<bitwidth>16</bitwidth>
</Value>
<direction>0</direction>
<if_type>1</if_type>
<array_size>8</array_size>
<bit_vecs>
<count>0</count>
<item_version>0</item_version>
</bit_vecs>
</item>
<item class_id_reference="3" object_id="_4">
<Value>
<Obj>
<type>1</type>
<id>4</id>
<name>in_block_3</name>
<fileName/>
<fileDirectory/>
<lineNumber>0</lineNumber>
<contextFuncName/>
<inlineStackInfo>
<count>0</count>
<item_version>0</item_version>
</inlineStackInfo>
<originalName>in_block[3]</originalName>
<rtlName/>
<coreName>RAM</coreName>
</Obj>
<bitwidth>16</bitwidth>
</Value>
<direction>0</direction>
<if_type>1</if_type>
<array_size>8</array_size>
<bit_vecs>
<count>0</count>
<item_version>0</item_version>
</bit_vecs>
</item>
<item class_id_reference="3" object_id="_5">
<Value>
<Obj>
<type>1</type>
<id>5</id>
<name>in_block_4</name>
<fileName/>
<fileDirectory/>
<lineNumber>0</lineNumber>
<contextFuncName/>
<inlineStackInfo>
<count>0</count>
<item_version>0</item_version>
</inlineStackInfo>
<originalName>in_block[4]</originalName>
<rtlName/>
<coreName>RAM</coreName>
</Obj>
<bitwidth>16</bitwidth>
</Value>
<direction>0</direction>
<if_type>1</if_type>
<array_size>8</array_size>
<bit_vecs>
<count>0</count>
<item_version>0</item_version>
</bit_vecs>
</item>
<item class_id_reference="3" object_id="_6">
<Value>
<Obj>
<type>1</type>
<id>6</id>
<name>in_block_5</name>
<fileName/>
<fileDirectory/>
<lineNumber>0</lineNumber>
<contextFuncName/>
<inlineStackInfo>
<count>0</count>
<item_version>0</item_version>
</inlineStackInfo>
<originalName>in_block[5]</originalName>
<rtlName/>
<coreName>RAM</coreName>
</Obj>
<bitwidth>16</bitwidth>
</Value>
<direction>0</direction>
<if_type>1</if_type>
<array_size>8</array_size>
<bit_vecs>
<count>0</count>
<item_version>0</item_version>
</bit_vecs>
</item>
<item class_id_reference="3" object_id="_7">
<Value>
<Obj>
<type>1</type>
<id>7</id>
<name>in_block_6</name>
<fileName/>
<fileDirectory/>
<lineNumber>0</lineNumber>
<contextFuncName/>
<inlineStackInfo>
<count>0</count>
<item_version>0</item_version>
</inlineStackInfo>
<originalName>in_block[6]</originalName>
<rtlName/>
<coreName>RAM</coreName>
</Obj>
<bitwidth>16</bitwidth>
</Value>
<direction>0</direction>
<if_type>1</if_type>
<array_size>8</array_size>
<bit_vecs>
<count>0</count>
<item_version>0</item_version>
</bit_vecs>
</item>
<item class_id_reference="3" object_id="_8">
<Value>
<Obj>
<type>1</type>
<id>8</id>
<name>in_block_7</name>
<fileName/>
<fileDirectory/>
<lineNumber>0</lineNumber>
<contextFuncName/>
<inlineStackInfo>
<count>0</count>
<item_version>0</item_version>
</inlineStackInfo>
<originalName>in_block[7]</originalName>
<rtlName/>
<coreName>RAM</coreName>
</Obj>
<bitwidth>16</bitwidth>
</Value>
<direction>0</direction>
<if_type>1</if_type>
<array_size>8</array_size>
<bit_vecs>
<count>0</count>
<item_version>0</item_version>
</bit_vecs>
</item>
<item class_id_reference="3" object_id="_9">
<Value>
<Obj>
<type>1</type>
<id>9</id>
<name>out_block</name>
<fileName/>
<fileDirectory/>
<lineNumber>0</lineNumber>
<contextFuncName/>
<inlineStackInfo>
<count>0</count>
<item_version>0</item_version>
</inlineStackInfo>
<originalName>out_block</originalName>
<rtlName/>
<coreName>RAM</coreName>
</Obj>
<bitwidth>16</bitwidth>
</Value>
<direction>1</direction>
<if_type>1</if_type>
<array_size>64</array_size>
<bit_vecs>
<count>0</count>
<item_version>0</item_version>
</bit_vecs>
</item>
</ports>
<nodes class_id="8" tracking_level="0" version="0">
<count>99</count>
<item_version>0</item_version>
<item class_id="9" tracking_level="1" version="0" object_id="_10">
<Value>
<Obj>
<type>0</type>
<id>18</id>
<name>row_outbuf</name>
<fileName/>
<fileDirectory/>
<lineNumber>0</lineNumber>
<contextFuncName/>
<inlineStackInfo>
<count>0</count>
<item_version>0</item_version>
</inlineStackInfo>
<originalName/>
<rtlName>row_outbuf_U</rtlName>
<coreName>RAM</coreName>
</Obj>
<bitwidth>16</bitwidth>
</Value>
<oprand_edges>
<count>1</count>
<item_version>0</item_version>
<item>156</item>
</oprand_edges>
<opcode>alloca</opcode>
<m_Display>0</m_Display>
</item>
<item class_id_reference="9" object_id="_11">
<Value>
<Obj>
<type>0</type>
<id>19</id>
<name>col_outbuf</name>
<fileName/>
<fileDirectory/>
<lineNumber>0</lineNumber>
<contextFuncName/>
<inlineStackInfo>
<count>0</count>
<item_version>0</item_version>
</inlineStackInfo>
<originalName/>
<rtlName>col_outbuf_U</rtlName>
<coreName>RAM</coreName>
</Obj>
<bitwidth>16</bitwidth>
</Value>
<oprand_edges>
<count>1</count>
<item_version>0</item_version>
<item>157</item>
</oprand_edges>
<opcode>alloca</opcode>
<m_Display>0</m_Display>
</item>
<item class_id_reference="9" object_id="_12">
<Value>
<Obj>
<type>0</type>
<id>20</id>
<name>col_inbuf_0</name>
<fileName>dct.c</fileName>
<fileDirectory>..</fileDirectory>
<lineNumber>27</lineNumber>
<contextFuncName>dct_2d</contextFuncName>
<inlineStackInfo>
<count>1</count>
<item_version>0</item_version>
<item class_id="11" tracking_level="0" version="0">
<first>/home/lfvelez/Documentos/ISPR/HLS/labsource/labs/lab3</first>
<second class_id="12" tracking_level="0" version="0">
<count>1</count>
<item_version>0</item_version>
<item class_id="13" tracking_level="0" version="0">
<first class_id="14" tracking_level="0" version="0">
<first>dct.c</first>
<second>dct_2d</second>
</first>
<second>27</second>
</item>
</second>
</item>
</inlineStackInfo>
<originalName>col_inbuf[0]</originalName>
<rtlName>col_inbuf_0_U</rtlName>
<coreName>RAM</coreName>
</Obj>
<bitwidth>16</bitwidth>
</Value>
<oprand_edges>
<count>1</count>
<item_version>0</item_version>
<item>158</item>
</oprand_edges>
<opcode>alloca</opcode>
<m_Display>0</m_Display>
</item>
<item class_id_reference="9" object_id="_13">
<Value>
<Obj>
<type>0</type>
<id>21</id>
<name>col_inbuf_1</name>
<fileName>dct.c</fileName>
<fileDirectory>..</fileDirectory>
<lineNumber>27</lineNumber>
<contextFuncName>dct_2d</contextFuncName>
<inlineStackInfo>
<count>1</count>
<item_version>0</item_version>
<item>
<first>/home/lfvelez/Documentos/ISPR/HLS/labsource/labs/lab3</first>
<second>
<count>1</count>
<item_version>0</item_version>
<item>
<first>
<first>dct.c</first>
<second>dct_2d</second>
</first>
<second>27</second>
</item>
</second>
</item>
</inlineStackInfo>
<originalName>col_inbuf[1]</originalName>
<rtlName>col_inbuf_1_U</rtlName>
<coreName>RAM</coreName>
</Obj>
<bitwidth>16</bitwidth>
</Value>
<oprand_edges>
<count>1</count>
<item_version>0</item_version>
<item>159</item>
</oprand_edges>
<opcode>alloca</opcode>
<m_Display>0</m_Display>
</item>
<item class_id_reference="9" object_id="_14">
<Value>
<Obj>
<type>0</type>
<id>22</id>
<name>col_inbuf_2</name>
<fileName>dct.c</fileName>
<fileDirectory>..</fileDirectory>
<lineNumber>27</lineNumber>
<contextFuncName>dct_2d</contextFuncName>
<inlineStackInfo>
<count>1</count>
<item_version>0</item_version>
<item>
<first>/home/lfvelez/Documentos/ISPR/HLS/labsource/labs/lab3</first>
<second>
<count>1</count>
<item_version>0</item_version>
<item>
<first>
<first>dct.c</first>
<second>dct_2d</second>
</first>
<second>27</second>
</item>
</second>
</item>
</inlineStackInfo>
<originalName>col_inbuf[2]</originalName>
<rtlName>col_inbuf_2_U</rtlName>
<coreName>RAM</coreName>
</Obj>
<bitwidth>16</bitwidth>
</Value>
<oprand_edges>
<count>1</count>
<item_version>0</item_version>
<item>160</item>
</oprand_edges>
<opcode>alloca</opcode>
<m_Display>0</m_Display>
</item>
<item class_id_reference="9" object_id="_15">
<Value>
<Obj>
<type>0</type>
<id>23</id>
<name>col_inbuf_3</name>
<fileName>dct.c</fileName>
<fileDirectory>..</fileDirectory>
<lineNumber>27</lineNumber>
<contextFuncName>dct_2d</contextFuncName>
<inlineStackInfo>
<count>1</count>
<item_version>0</item_version>
<item>
<first>/home/lfvelez/Documentos/ISPR/HLS/labsource/labs/lab3</first>
<second>
<count>1</count>
<item_version>0</item_version>
<item>
<first>
<first>dct.c</first>
<second>dct_2d</second>
</first>
<second>27</second>
</item>
</second>
</item>
</inlineStackInfo>
<originalName>col_inbuf[3]</originalName>
<rtlName>col_inbuf_3_U</rtlName>
<coreName>RAM</coreName>
</Obj>
<bitwidth>16</bitwidth>
</Value>
<oprand_edges>
<count>1</count>
<item_version>0</item_version>
<item>161</item>
</oprand_edges>
<opcode>alloca</opcode>
<m_Display>0</m_Display>
</item>
<item class_id_reference="9" object_id="_16">
<Value>
<Obj>
<type>0</type>
<id>24</id>
<name>col_inbuf_4</name>
<fileName>dct.c</fileName>
<fileDirectory>..</fileDirectory>
<lineNumber>27</lineNumber>
<contextFuncName>dct_2d</contextFuncName>
<inlineStackInfo>
<count>1</count>
<item_version>0</item_version>
<item>
<first>/home/lfvelez/Documentos/ISPR/HLS/labsource/labs/lab3</first>
<second>
<count>1</count>
<item_version>0</item_version>
<item>
<first>
<first>dct.c</first>
<second>dct_2d</second>
</first>
<second>27</second>
</item>
</second>
</item>
</inlineStackInfo>
<originalName>col_inbuf[4]</originalName>
<rtlName>col_inbuf_4_U</rtlName>
<coreName>RAM</coreName>
</Obj>
<bitwidth>16</bitwidth>
</Value>
<oprand_edges>
<count>1</count>
<item_version>0</item_version>
<item>162</item>
</oprand_edges>
<opcode>alloca</opcode>
<m_Display>0</m_Display>
</item>
<item class_id_reference="9" object_id="_17">
<Value>
<Obj>
<type>0</type>
<id>25</id>
<name>col_inbuf_5</name>
<fileName>dct.c</fileName>
<fileDirectory>..</fileDirectory>
<lineNumber>27</lineNumber>
<contextFuncName>dct_2d</contextFuncName>
<inlineStackInfo>
<count>1</count>
<item_version>0</item_version>
<item>
<first>/home/lfvelez/Documentos/ISPR/HLS/labsource/labs/lab3</first>
<second>
<count>1</count>
<item_version>0</item_version>
<item>
<first>
<first>dct.c</first>
<second>dct_2d</second>
</first>
<second>27</second>
</item>
</second>
</item>
</inlineStackInfo>
<originalName>col_inbuf[5]</originalName>
<rtlName>col_inbuf_5_U</rtlName>
<coreName>RAM</coreName>
</Obj>
<bitwidth>16</bitwidth>
</Value>
<oprand_edges>
<count>1</count>
<item_version>0</item_version>
<item>163</item>
</oprand_edges>
<opcode>alloca</opcode>
<m_Display>0</m_Display>
</item>
<item class_id_reference="9" object_id="_18">
<Value>
<Obj>
<type>0</type>
<id>26</id>
<name>col_inbuf_6</name>
<fileName>dct.c</fileName>
<fileDirectory>..</fileDirectory>
<lineNumber>27</lineNumber>
<contextFuncName>dct_2d</contextFuncName>
<inlineStackInfo>
<count>1</count>
<item_version>0</item_version>
<item>
<first>/home/lfvelez/Documentos/ISPR/HLS/labsource/labs/lab3</first>
<second>
<count>1</count>
<item_version>0</item_version>
<item>
<first>
<first>dct.c</first>
<second>dct_2d</second>
</first>
<second>27</second>
</item>
</second>
</item>
</inlineStackInfo>
<originalName>col_inbuf[6]</originalName>
<rtlName>col_inbuf_6_U</rtlName>
<coreName>RAM</coreName>
</Obj>
<bitwidth>16</bitwidth>
</Value>
<oprand_edges>
<count>1</count>
<item_version>0</item_version>
<item>164</item>
</oprand_edges>
<opcode>alloca</opcode>
<m_Display>0</m_Display>
</item>
<item class_id_reference="9" object_id="_19">
<Value>
<Obj>
<type>0</type>
<id>27</id>
<name>col_inbuf_7</name>
<fileName>dct.c</fileName>
<fileDirectory>..</fileDirectory>
<lineNumber>27</lineNumber>
<contextFuncName>dct_2d</contextFuncName>
<inlineStackInfo>
<count>1</count>
<item_version>0</item_version>
<item>
<first>/home/lfvelez/Documentos/ISPR/HLS/labsource/labs/lab3</first>
<second>
<count>1</count>
<item_version>0</item_version>
<item>
<first>
<first>dct.c</first>
<second>dct_2d</second>
</first>
<second>27</second>
</item>
</second>
</item>
</inlineStackInfo>
<originalName>col_inbuf[7]</originalName>
<rtlName>col_inbuf_7_U</rtlName>
<coreName>RAM</coreName>
</Obj>
<bitwidth>16</bitwidth>
</Value>
<oprand_edges>
<count>1</count>
<item_version>0</item_version>
<item>165</item>
</oprand_edges>
<opcode>alloca</opcode>
<m_Display>0</m_Display>
</item>
<item class_id_reference="9" object_id="_20">
<Value>
<Obj>
<type>0</type>
<id>28</id>
<name/>
<fileName>dct.c</fileName>
<fileDirectory>..</fileDirectory>
<lineNumber>32</lineNumber>
<contextFuncName>dct_2d</contextFuncName>
<inlineStackInfo>
<count>1</count>
<item_version>0</item_version>
<item>
<first>/home/lfvelez/Documentos/ISPR/HLS/labsource/labs/lab3</first>
<second>
<count>1</count>
<item_version>0</item_version>
<item>
<first>
<first>dct.c</first>
<second>dct_2d</second>
</first>
<second>32</second>
</item>
</second>
</item>
</inlineStackInfo>
<originalName/>
<rtlName/>
<coreName/>
</Obj>
<bitwidth>0</bitwidth>
</Value>
<oprand_edges>
<count>1</count>
<item_version>0</item_version>
<item>166</item>
</oprand_edges>
<opcode>br</opcode>
<m_Display>0</m_Display>
</item>
<item class_id_reference="9" object_id="_21">
<Value>
<Obj>
<type>0</type>
<id>30</id>
<name>i</name>
<fileName/>
<fileDirectory/>
<lineNumber>0</lineNumber>
<contextFuncName/>
<inlineStackInfo>
<count>0</count>
<item_version>0</item_version>
</inlineStackInfo>
<originalName>i</originalName>
<rtlName/>
<coreName/>
</Obj>
<bitwidth>4</bitwidth>
</Value>
<oprand_edges>
<count>4</count>
<item_version>0</item_version>
<item>168</item>
<item>169</item>
<item>170</item>
<item>171</item>
</oprand_edges>
<opcode>phi</opcode>
<m_Display>0</m_Display>
</item>
<item class_id_reference="9" object_id="_22">
<Value>
<Obj>
<type>0</type>
<id>31</id>
<name>tmp</name>
<fileName>dct.c</fileName>
<fileDirectory>..</fileDirectory>
<lineNumber>32</lineNumber>
<contextFuncName>dct_2d</contextFuncName>
<inlineStackInfo>
<count>1</count>
<item_version>0</item_version>
<item>
<first>/home/lfvelez/Documentos/ISPR/HLS/labsource/labs/lab3</first>
<second>
<count>1</count>
<item_version>0</item_version>
<item>
<first>
<first>dct.c</first>
<second>dct_2d</second>
</first>
<second>32</second>
</item>
</second>
</item>
</inlineStackInfo>
<originalName/>
<rtlName>tmp_fu_406_p2</rtlName>
<coreName/>
</Obj>
<bitwidth>1</bitwidth>
</Value>
<oprand_edges>
<count>2</count>
<item_version>0</item_version>
<item>172</item>
<item>174</item>
</oprand_edges>
<opcode>icmp</opcode>
<m_Display>0</m_Display>
</item>
<item class_id_reference="9" object_id="_23">
<Value>
<Obj>
<type>0</type>
<id>33</id>
<name>i_4</name>
<fileName>dct.c</fileName>
<fileDirectory>..</fileDirectory>
<lineNumber>32</lineNumber>
<contextFuncName>dct_2d</contextFuncName>
<inlineStackInfo>
<count>1</count>
<item_version>0</item_version>
<item>
<first>/home/lfvelez/Documentos/ISPR/HLS/labsource/labs/lab3</first>
<second>
<count>1</count>
<item_version>0</item_version>
<item>
<first>
<first>dct.c</first>
<second>dct_2d</second>
</first>
<second>32</second>
</item>
</second>
</item>
</inlineStackInfo>
<originalName>i</originalName>
<rtlName>i_4_fu_412_p2</rtlName>
<coreName/>
</Obj>
<bitwidth>4</bitwidth>
</Value>
<oprand_edges>
<count>2</count>
<item_version>0</item_version>
<item>175</item>
<item>177</item>
</oprand_edges>
<opcode>add</opcode>
<m_Display>0</m_Display>
</item>
<item class_id_reference="9" object_id="_24">
<Value>
<Obj>
<type>0</type>
<id>34</id>
<name/>
<fileName>dct.c</fileName>
<fileDirectory>..</fileDirectory>
<lineNumber>32</lineNumber>
<contextFuncName>dct_2d</contextFuncName>
<inlineStackInfo>
<count>1</count>
<item_version>0</item_version>
<item>
<first>/home/lfvelez/Documentos/ISPR/HLS/labsource/labs/lab3</first>
<second>
<count>1</count>
<item_version>0</item_version>
<item>
<first>
<first>dct.c</first>
<second>dct_2d</second>
</first>
<second>32</second>
</item>
</second>
</item>
</inlineStackInfo>
<originalName/>
<rtlName/>
<coreName/>
</Obj>
<bitwidth>0</bitwidth>
</Value>
<oprand_edges>
<count>3</count>
<item_version>0</item_version>
<item>178</item>
<item>179</item>
<item>180</item>
</oprand_edges>
<opcode>br</opcode>
<m_Display>0</m_Display>
</item>
<item class_id_reference="9" object_id="_25">
<Value>
<Obj>
<type>0</type>
<id>37</id>
<name/>
<fileName>dct.c</fileName>
<fileDirectory>..</fileDirectory>
<lineNumber>33</lineNumber>
<contextFuncName>dct_2d</contextFuncName>
<inlineStackInfo>
<count>1</count>
<item_version>0</item_version>
<item>
<first>/home/lfvelez/Documentos/ISPR/HLS/labsource/labs/lab3</first>
<second>
<count>1</count>
<item_version>0</item_version>
<item>
<first>
<first>dct.c</first>
<second>dct_2d</second>
</first>
<second>33</second>
</item>
</second>
</item>
</inlineStackInfo>
<originalName/>
<rtlName>grp_dct_1d_fu_363</rtlName>
<coreName/>
</Obj>
<bitwidth>0</bitwidth>
</Value>
<oprand_edges>
<count>20</count>
<item_version>0</item_version>
<item>183</item>
<item>184</item>
<item>185</item>
<item>186</item>
<item>187</item>
<item>188</item>
<item>189</item>
<item>190</item>
<item>191</item>
<item>192</item>
<item>193</item>
<item>194</item>
<item>401</item>
<item>402</item>
<item>403</item>
<item>404</item>
<item>405</item>
<item>406</item>
<item>407</item>
<item>408</item>
</oprand_edges>
<opcode>call</opcode>
<m_Display>0</m_Display>
</item>
<item class_id_reference="9" object_id="_26">
<Value>
<Obj>
<type>0</type>
<id>38</id>
<name/>
<fileName>dct.c</fileName>
<fileDirectory>..</fileDirectory>
<lineNumber>32</lineNumber>
<contextFuncName>dct_2d</contextFuncName>
<inlineStackInfo>
<count>1</count>
<item_version>0</item_version>
<item>
<first>/home/lfvelez/Documentos/ISPR/HLS/labsource/labs/lab3</first>
<second>
<count>1</count>
<item_version>0</item_version>
<item>
<first>
<first>dct.c</first>
<second>dct_2d</second>
</first>
<second>32</second>
</item>
</second>
</item>
</inlineStackInfo>
<originalName/>
<rtlName/>
<coreName/>
</Obj>
<bitwidth>0</bitwidth>
</Value>
<oprand_edges>
<count>1</count>
<item_version>0</item_version>
<item>195</item>
</oprand_edges>
<opcode>br</opcode>
<m_Display>0</m_Display>
</item>
<item class_id_reference="9" object_id="_27">
<Value>
<Obj>
<type>0</type>
<id>40</id>
<name/>
<fileName/>
<fileDirectory/>
<lineNumber>0</lineNumber>
<contextFuncName/>
<inlineStackInfo>
<count>0</count>
<item_version>0</item_version>
</inlineStackInfo>
<originalName/>
<rtlName/>
<coreName/>
</Obj>
<bitwidth>0</bitwidth>
</Value>
<oprand_edges>
<count>1</count>
<item_version>0</item_version>
<item>181</item>
</oprand_edges>
<opcode>br</opcode>
<m_Display>0</m_Display>
</item>
<item class_id_reference="9" object_id="_28">
<Value>
<Obj>
<type>0</type>
<id>42</id>
<name>indvar_flatten</name>
<fileName/>
<fileDirectory/>
<lineNumber>0</lineNumber>
<contextFuncName/>
<inlineStackInfo>
<count>0</count>
<item_version>0</item_version>
</inlineStackInfo>
<originalName/>
<rtlName/>
<coreName/>
</Obj>
<bitwidth>7</bitwidth>
</Value>
<oprand_edges>
<count>4</count>
<item_version>0</item_version>
<item>196</item>
<item>197</item>
<item>199</item>
<item>200</item>
</oprand_edges>
<opcode>phi</opcode>
<m_Display>0</m_Display>
</item>
<item class_id_reference="9" object_id="_29">
<Value>
<Obj>
<type>0</type>
<id>43</id>
<name>j</name>
<fileName>dct.c</fileName>
<fileDirectory>..</fileDirectory>
<lineNumber>40</lineNumber>
<contextFuncName>dct_2d</contextFuncName>
<inlineStackInfo>
<count>1</count>
<item_version>0</item_version>
<item>
<first>/home/lfvelez/Documentos/ISPR/HLS/labsource/labs/lab3</first>
<second>
<count>1</count>
<item_version>0</item_version>
<item>
<first>
<first>dct.c</first>
<second>dct_2d</second>
</first>
<second>40</second>
</item>
</second>
</item>
</inlineStackInfo>
<originalName/>
<rtlName/>
<coreName/>
</Obj>
<bitwidth>4</bitwidth>
</Value>
<oprand_edges>
<count>4</count>
<item_version>0</item_version>
<item>201</item>
<item>202</item>
<item>203</item>
<item>204</item>
</oprand_edges>
<opcode>phi</opcode>
<m_Display>0</m_Display>
</item>
<item class_id_reference="9" object_id="_30">
<Value>
<Obj>
<type>0</type>
<id>44</id>
<name>i_1</name>
<fileName/>
<fileDirectory/>
<lineNumber>0</lineNumber>
<contextFuncName/>
<inlineStackInfo>
<count>0</count>
<item_version>0</item_version>
</inlineStackInfo>
<originalName>i</originalName>
<rtlName/>
<coreName/>
</Obj>
<bitwidth>4</bitwidth>
</Value>
<oprand_edges>
<count>4</count>
<item_version>0</item_version>
<item>205</item>
<item>206</item>
<item>207</item>
<item>208</item>
</oprand_edges>
<opcode>phi</opcode>
<m_Display>0</m_Display>
</item>
<item class_id_reference="9" object_id="_31">
<Value>
<Obj>
<type>0</type>
<id>45</id>
<name>exitcond_flatten</name>
<fileName/>
<fileDirectory/>
<lineNumber>0</lineNumber>
<contextFuncName/>
<inlineStackInfo>
<count>0</count>
<item_version>0</item_version>
</inlineStackInfo>
<originalName/>
<rtlName>exitcond_flatten_fu_418_p2</rtlName>
<coreName/>
</Obj>
<bitwidth>1</bitwidth>
</Value>
<oprand_edges>
<count>2</count>
<item_version>0</item_version>
<item>209</item>
<item>211</item>
</oprand_edges>
<opcode>icmp</opcode>
<m_Display>0</m_Display>
</item>
<item class_id_reference="9" object_id="_32">
<Value>
<Obj>
<type>0</type>
<id>46</id>
<name>indvar_flatten_next</name>
<fileName/>
<fileDirectory/>
<lineNumber>0</lineNumber>
<contextFuncName/>
<inlineStackInfo>
<count>0</count>
<item_version>0</item_version>
</inlineStackInfo>
<originalName/>
<rtlName>indvar_flatten_next_fu_424_p2</rtlName>
<coreName/>
</Obj>
<bitwidth>7</bitwidth>
</Value>
<oprand_edges>
<count>2</count>
<item_version>0</item_version>
<item>212</item>
<item>214</item>
</oprand_edges>
<opcode>add</opcode>
<m_Display>0</m_Display>
</item>
<item class_id_reference="9" object_id="_33">
<Value>
<Obj>
<type>0</type>
<id>47</id>
<name/>
<fileName/>
<fileDirectory/>
<lineNumber>0</lineNumber>
<contextFuncName/>
<inlineStackInfo>
<count>0</count>
<item_version>0</item_version>
</inlineStackInfo>
<originalName/>
<rtlName/>
<coreName/>
</Obj>
<bitwidth>0</bitwidth>
</Value>
<oprand_edges>
<count>3</count>
<item_version>0</item_version>
<item>215</item>
<item>216</item>
<item>217</item>
</oprand_edges>
<opcode>br</opcode>
<m_Display>0</m_Display>
</item>
<item class_id_reference="9" object_id="_34">
<Value>
<Obj>
<type>0</type>
<id>49</id>
<name>j_2</name>
<fileName>dct.c</fileName>
<fileDirectory>..</fileDirectory>
<lineNumber>37</lineNumber>
<contextFuncName>dct_2d</contextFuncName>
<inlineStackInfo>
<count>1</count>
<item_version>0</item_version>
<item>
<first>/home/lfvelez/Documentos/ISPR/HLS/labsource/labs/lab3</first>
<second>
<count>1</count>
<item_version>0</item_version>
<item>
<first>
<first>dct.c</first>
<second>dct_2d</second>
</first>
<second>37</second>
</item>
</second>
</item>
</inlineStackInfo>
<originalName>j</originalName>
<rtlName>j_2_fu_430_p2</rtlName>
<coreName/>
</Obj>
<bitwidth>4</bitwidth>
</Value>
<oprand_edges>
<count>2</count>
<item_version>0</item_version>
<item>222</item>
<item>223</item>
</oprand_edges>
<opcode>add</opcode>
<m_Display>0</m_Display>
</item>
<item class_id_reference="9" object_id="_35">
<Value>
<Obj>
<type>0</type>
<id>52</id>
<name>tmp_1</name>
<fileName>dct.c</fileName>
<fileDirectory>..</fileDirectory>
<lineNumber>39</lineNumber>
<contextFuncName>dct_2d</contextFuncName>
<inlineStackInfo>
<count>1</count>
<item_version>0</item_version>
<item>
<first>/home/lfvelez/Documentos/ISPR/HLS/labsource/labs/lab3</first>
<second>
<count>1</count>
<item_version>0</item_version>
<item>
<first>
<first>dct.c</first>
<second>dct_2d</second>
</first>
<second>39</second>
</item>
</second>
</item>
</inlineStackInfo>
<originalName/>
<rtlName>tmp_1_fu_436_p2</rtlName>
<coreName/>
</Obj>
<bitwidth>1</bitwidth>
</Value>
<oprand_edges>
<count>2</count>
<item_version>0</item_version>
<item>224</item>
<item>225</item>
</oprand_edges>
<opcode>icmp</opcode>
<m_Display>0</m_Display>
</item>
<item class_id_reference="9" object_id="_36">
<Value>
<Obj>
<type>0</type>
<id>53</id>
<name>i_1_mid2</name>
<fileName>dct.c</fileName>
<fileDirectory>..</fileDirectory>
<lineNumber>39</lineNumber>
<contextFuncName>dct_2d</contextFuncName>
<inlineStackInfo>
<count>1</count>
<item_version>0</item_version>
<item>
<first>/home/lfvelez/Documentos/ISPR/HLS/labsource/labs/lab3</first>
<second>
<count>1</count>
<item_version>0</item_version>
<item>
<first>
<first>dct.c</first>
<second>dct_2d</second>
</first>
<second>39</second>
</item>
</second>
</item>
</inlineStackInfo>
<originalName/>
<rtlName>i_1_mid2_fu_442_p3</rtlName>
<coreName/>
</Obj>
<bitwidth>4</bitwidth>
</Value>
<oprand_edges>
<count>3</count>
<item_version>0</item_version>
<item>226</item>
<item>227</item>
<item>228</item>
</oprand_edges>
<opcode>select</opcode>
<m_Display>0</m_Display>
</item>
<item class_id_reference="9" object_id="_37">
<Value>
<Obj>
<type>0</type>
<id>54</id>
<name>tmp_3_mid2_v</name>
<fileName>dct.c</fileName>
<fileDirectory>..</fileDirectory>
<lineNumber>40</lineNumber>
<contextFuncName>dct_2d</contextFuncName>
<inlineStackInfo>
<count>1</count>
<item_version>0</item_version>
<item>
<first>/home/lfvelez/Documentos/ISPR/HLS/labsource/labs/lab3</first>
<second>
<count>1</count>
<item_version>0</item_version>
<item>
<first>
<first>dct.c</first>
<second>dct_2d</second>
</first>
<second>40</second>
</item>
</second>
</item>
</inlineStackInfo>
<originalName/>
<rtlName>tmp_3_mid2_v_fu_450_p3</rtlName>
<coreName/>
</Obj>
<bitwidth>4</bitwidth>
</Value>
<oprand_edges>
<count>3</count>
<item_version>0</item_version>
<item>229</item>
<item>230</item>
<item>231</item>
</oprand_edges>
<opcode>select</opcode>
<m_Display>0</m_Display>
</item>
<item class_id_reference="9" object_id="_38">
<Value>
<Obj>
<type>0</type>
<id>55</id>
<name>tmp_3_mid2</name>
<fileName>dct.c</fileName>
<fileDirectory>..</fileDirectory>
<lineNumber>40</lineNumber>
<contextFuncName>dct_2d</contextFuncName>
<inlineStackInfo>
<count>1</count>
<item_version>0</item_version>
<item>
<first>/home/lfvelez/Documentos/ISPR/HLS/labsource/labs/lab3</first>
<second>
<count>1</count>
<item_version>0</item_version>
<item>
<first>
<first>dct.c</first>
<second>dct_2d</second>
</first>
<second>40</second>
</item>
</second>
</item>
</inlineStackInfo>
<originalName/>
<rtlName>tmp_3_mid2_fu_492_p1</rtlName>
<coreName/>
</Obj>
<bitwidth>64</bitwidth>
</Value>
<oprand_edges>
<count>1</count>
<item_version>0</item_version>
<item>232</item>
</oprand_edges>
<opcode>zext</opcode>
<m_Display>0</m_Display>
</item>
<item class_id_reference="9" object_id="_39">
<Value>
<Obj>
<type>0</type>
<id>56</id>
<name>tmp_3_mid2_cast</name>
<fileName>dct.c</fileName>
<fileDirectory>..</fileDirectory>
<lineNumber>40</lineNumber>
<contextFuncName>dct_2d</contextFuncName>
<inlineStackInfo>
<count>1</count>
<item_version>0</item_version>
<item>
<first>/home/lfvelez/Documentos/ISPR/HLS/labsource/labs/lab3</first>
<second>
<count>1</count>
<item_version>0</item_version>
<item>
<first>
<first>dct.c</first>
<second>dct_2d</second>
</first>
<second>40</second>
</item>
</second>
</item>
</inlineStackInfo>
<originalName/>
<rtlName>tmp_3_mid2_cast_fu_462_p1</rtlName>
<coreName/>
</Obj>
<bitwidth>8</bitwidth>
</Value>
<oprand_edges>
<count>1</count>
<item_version>0</item_version>
<item>233</item>
</oprand_edges>
<opcode>zext</opcode>
<m_Display>0</m_Display>
</item>
<item class_id_reference="9" object_id="_40">
<Value>
<Obj>
<type>0</type>
<id>60</id>
<name>tmp_8</name>
<fileName>dct.c</fileName>
<fileDirectory>..</fileDirectory>
<lineNumber>39</lineNumber>
<contextFuncName>dct_2d</contextFuncName>
<inlineStackInfo>
<count>1</count>
<item_version>0</item_version>
<item>
<first>/home/lfvelez/Documentos/ISPR/HLS/labsource/labs/lab3</first>
<second>
<count>1</count>
<item_version>0</item_version>
<item>
<first>
<first>dct.c</first>
<second>dct_2d</second>
</first>
<second>39</second>
</item>
</second>
</item>
</inlineStackInfo>
<originalName/>
<rtlName>tmp_8_fu_465_p3</rtlName>
<coreName/>
</Obj>
<bitwidth>7</bitwidth>
</Value>
<oprand_edges>
<count>3</count>
<item_version>0</item_version>
<item>235</item>
<item>236</item>
<item>238</item>
</oprand_edges>
<opcode>bitconcatenate</opcode>
<m_Display>0</m_Display>
</item>
<item class_id_reference="9" object_id="_41">
<Value>
<Obj>
<type>0</type>
<id>61</id>
<name>tmp_9_cast</name>
<fileName>dct.c</fileName>
<fileDirectory>..</fileDirectory>
<lineNumber>40</lineNumber>
<contextFuncName>dct_2d</contextFuncName>
<inlineStackInfo>
<count>1</count>
<item_version>0</item_version>
<item>
<first>/home/lfvelez/Documentos/ISPR/HLS/labsource/labs/lab3</first>
<second>
<count>1</count>
<item_version>0</item_version>
<item>
<first>
<first>dct.c</first>
<second>dct_2d</second>
</first>
<second>40</second>
</item>
</second>
</item>
</inlineStackInfo>
<originalName/>
<rtlName>tmp_9_cast_fu_472_p1</rtlName>
<coreName/>
</Obj>
<bitwidth>8</bitwidth>
</Value>
<oprand_edges>
<count>1</count>
<item_version>0</item_version>
<item>239</item>
</oprand_edges>
<opcode>zext</opcode>
<m_Display>0</m_Display>
</item>
<item class_id_reference="9" object_id="_42">
<Value>
<Obj>
<type>0</type>
<id>62</id>
<name>tmp_2</name>
<fileName>dct.c</fileName>
<fileDirectory>..</fileDirectory>
<lineNumber>40</lineNumber>
<contextFuncName>dct_2d</contextFuncName>
<inlineStackInfo>
<count>1</count>
<item_version>0</item_version>
<item>
<first>/home/lfvelez/Documentos/ISPR/HLS/labsource/labs/lab3</first>
<second>
<count>1</count>
<item_version>0</item_version>
<item>
<first>
<first>dct.c</first>
<second>dct_2d</second>
</first>
<second>40</second>
</item>
</second>
</item>
</inlineStackInfo>
<originalName/>
<rtlName>tmp_2_fu_476_p2</rtlName>
<coreName/>
</Obj>
<bitwidth>8</bitwidth>
</Value>
<oprand_edges>
<count>2</count>
<item_version>0</item_version>
<item>240</item>
<item>241</item>
</oprand_edges>
<opcode>add</opcode>
<m_Display>0</m_Display>
</item>
<item class_id_reference="9" object_id="_43">
<Value>
<Obj>
<type>0</type>
<id>63</id>
<name>tmp_11_cast</name>
<fileName>dct.c</fileName>
<fileDirectory>..</fileDirectory>
<lineNumber>40</lineNumber>
<contextFuncName>dct_2d</contextFuncName>
<inlineStackInfo>
<count>1</count>
<item_version>0</item_version>
<item>
<first>/home/lfvelez/Documentos/ISPR/HLS/labsource/labs/lab3</first>
<second>
<count>1</count>
<item_version>0</item_version>
<item>
<first>
<first>dct.c</first>
<second>dct_2d</second>
</first>
<second>40</second>
</item>
</second>
</item>
</inlineStackInfo>
<originalName/>
<rtlName>tmp_11_cast_fu_482_p1</rtlName>
<coreName/>
</Obj>
<bitwidth>64</bitwidth>
</Value>
<oprand_edges>
<count>1</count>
<item_version>0</item_version>
<item>242</item>
</oprand_edges>
<opcode>zext</opcode>
<m_Display>0</m_Display>
</item>
<item class_id_reference="9" object_id="_44">
<Value>
<Obj>
<type>0</type>
<id>64</id>
<name>row_outbuf_addr</name>
<fileName>dct.c</fileName>
<fileDirectory>..</fileDirectory>
<lineNumber>40</lineNumber>
<contextFuncName>dct_2d</contextFuncName>
<inlineStackInfo>
<count>1</count>
<item_version>0</item_version>
<item>
<first>/home/lfvelez/Documentos/ISPR/HLS/labsource/labs/lab3</first>
<second>
<count>1</count>
<item_version>0</item_version>
<item>
<first>
<first>dct.c</first>
<second>dct_2d</second>
</first>
<second>40</second>
</item>
</second>
</item>
</inlineStackInfo>
<originalName/>
<rtlName/>
<coreName/>
</Obj>
<bitwidth>6</bitwidth>
</Value>
<oprand_edges>
<count>3</count>
<item_version>0</item_version>
<item>243</item>
<item>245</item>
<item>246</item>
</oprand_edges>
<opcode>getelementptr</opcode>
<m_Display>0</m_Display>
</item>
<item class_id_reference="9" object_id="_45">
<Value>
<Obj>
<type>0</type>
<id>65</id>
<name>row_outbuf_load</name>
<fileName>dct.c</fileName>
<fileDirectory>..</fileDirectory>
<lineNumber>40</lineNumber>
<contextFuncName>dct_2d</contextFuncName>
<inlineStackInfo>
<count>1</count>
<item_version>0</item_version>
<item>
<first>/home/lfvelez/Documentos/ISPR/HLS/labsource/labs/lab3</first>
<second>
<count>1</count>
<item_version>0</item_version>
<item>
<first>
<first>dct.c</first>
<second>dct_2d</second>
</first>
<second>40</second>
</item>
</second>
</item>
</inlineStackInfo>
<originalName/>
<rtlName/>
<coreName/>
</Obj>
<bitwidth>16</bitwidth>
</Value>
<oprand_edges>
<count>1</count>
<item_version>0</item_version>
<item>247</item>
</oprand_edges>
<opcode>load</opcode>
<m_Display>0</m_Display>
</item>
<item class_id_reference="9" object_id="_46">
<Value>
<Obj>
<type>0</type>
<id>66</id>
<name>tmp_3</name>
<fileName>dct.c</fileName>
<fileDirectory>..</fileDirectory>
<lineNumber>39</lineNumber>
<contextFuncName>dct_2d</contextFuncName>
<inlineStackInfo>
<count>1</count>
<item_version>0</item_version>
<item>
<first>/home/lfvelez/Documentos/ISPR/HLS/labsource/labs/lab3</first>
<second>
<count>1</count>
<item_version>0</item_version>
<item>
<first>
<first>dct.c</first>
<second>dct_2d</second>
</first>
<second>39</second>
</item>
</second>
</item>
</inlineStackInfo>
<originalName/>
<rtlName>tmp_3_fu_458_p1</rtlName>
<coreName/>
</Obj>
<bitwidth>3</bitwidth>
</Value>
<oprand_edges>
<count>1</count>
<item_version>0</item_version>
<item>248</item>
</oprand_edges>
<opcode>trunc</opcode>
<m_Display>0</m_Display>
</item>
<item class_id_reference="9" object_id="_47">
<Value>
<Obj>
<type>0</type>
<id>67</id>
<name/>
<fileName>dct.c</fileName>
<fileDirectory>..</fileDirectory>
<lineNumber>40</lineNumber>
<contextFuncName>dct_2d</contextFuncName>
<inlineStackInfo>
<count>1</count>
<item_version>0</item_version>
<item>
<first>/home/lfvelez/Documentos/ISPR/HLS/labsource/labs/lab3</first>
<second>
<count>1</count>
<item_version>0</item_version>
<item>
<first>
<first>dct.c</first>
<second>dct_2d</second>
</first>
<second>40</second>
</item>
</second>
</item>
</inlineStackInfo>
<originalName/>
<rtlName/>
<coreName/>
</Obj>
<bitwidth>0</bitwidth>
</Value>
<oprand_edges>
<count>16</count>
<item_version>0</item_version>
<item>249</item>
<item>250</item>
<item>251</item>
<item>252</item>
<item>254</item>
<item>255</item>
<item>257</item>
<item>258</item>
<item>260</item>
<item>261</item>
<item>263</item>
<item>264</item>
<item>266</item>
<item>267</item>
<item>269</item>
<item>270</item>
</oprand_edges>
<opcode>switch</opcode>
<m_Display>0</m_Display>
</item>
<item class_id_reference="9" object_id="_48">
<Value>
<Obj>
<type>0</type>
<id>69</id>
<name>col_inbuf_6_addr</name>
<fileName>dct.c</fileName>
<fileDirectory>..</fileDirectory>
<lineNumber>40</lineNumber>
<contextFuncName>dct_2d</contextFuncName>
<inlineStackInfo>
<count>1</count>
<item_version>0</item_version>
<item>
<first>/home/lfvelez/Documentos/ISPR/HLS/labsource/labs/lab3</first>
<second>
<count>1</count>
<item_version>0</item_version>
<item>
<first>
<first>dct.c</first>
<second>dct_2d</second>
</first>
<second>40</second>
</item>
</second>
</item>
</inlineStackInfo>
<originalName/>
<rtlName/>
<coreName/>
</Obj>
<bitwidth>3</bitwidth>
</Value>
<oprand_edges>
<count>3</count>
<item_version>0</item_version>
<item>389</item>
<item>390</item>
<item>391</item>
</oprand_edges>
<opcode>getelementptr</opcode>
<m_Display>0</m_Display>
</item>
<item class_id_reference="9" object_id="_49">
<Value>
<Obj>
<type>0</type>
<id>70</id>
<name/>
<fileName>dct.c</fileName>
<fileDirectory>..</fileDirectory>
<lineNumber>40</lineNumber>
<contextFuncName>dct_2d</contextFuncName>
<inlineStackInfo>
<count>1</count>
<item_version>0</item_version>
<item>
<first>/home/lfvelez/Documentos/ISPR/HLS/labsource/labs/lab3</first>
<second>
<count>1</count>
<item_version>0</item_version>
<item>
<first>
<first>dct.c</first>
<second>dct_2d</second>
</first>
<second>40</second>
</item>
</second>
</item>
</inlineStackInfo>
<originalName/>
<rtlName/>
<coreName/>
</Obj>
<bitwidth>0</bitwidth>
</Value>
<oprand_edges>
<count>2</count>
<item_version>0</item_version>
<item>392</item>
<item>393</item>
</oprand_edges>
<opcode>store</opcode>
<m_Display>0</m_Display>
</item>
<item class_id_reference="9" object_id="_50">
<Value>
<Obj>
<type>0</type>
<id>71</id>
<name/>
<fileName>dct.c</fileName>
<fileDirectory>..</fileDirectory>
<lineNumber>40</lineNumber>
<contextFuncName>dct_2d</contextFuncName>
<inlineStackInfo>
<count>1</count>
<item_version>0</item_version>
<item>
<first>/home/lfvelez/Documentos/ISPR/HLS/labsource/labs/lab3</first>
<second>
<count>1</count>
<item_version>0</item_version>
<item>
<first>
<first>dct.c</first>
<second>dct_2d</second>
</first>
<second>40</second>
</item>
</second>
</item>
</inlineStackInfo>
<originalName/>
<rtlName/>
<coreName/>
</Obj>
<bitwidth>0</bitwidth>
</Value>
<oprand_edges>
<count>1</count>
<item_version>0</item_version>
<item>394</item>
</oprand_edges>
<opcode>br</opcode>
<m_Display>0</m_Display>
</item>
<item class_id_reference="9" object_id="_51">
<Value>
<Obj>
<type>0</type>
<id>73</id>
<name>col_inbuf_5_addr</name>
<fileName>dct.c</fileName>
<fileDirectory>..</fileDirectory>
<lineNumber>40</lineNumber>
<contextFuncName>dct_2d</contextFuncName>
<inlineStackInfo>
<count>1</count>
<item_version>0</item_version>
<item>
<first>/home/lfvelez/Documentos/ISPR/HLS/labsource/labs/lab3</first>
<second>
<count>1</count>
<item_version>0</item_version>
<item>
<first>
<first>dct.c</first>
<second>dct_2d</second>
</first>
<second>40</second>
</item>
</second>
</item>
</inlineStackInfo>
<originalName/>
<rtlName/>
<coreName/>
</Obj>
<bitwidth>3</bitwidth>
</Value>
<oprand_edges>
<count>3</count>
<item_version>0</item_version>
<item>383</item>
<item>384</item>
<item>385</item>
</oprand_edges>
<opcode>getelementptr</opcode>
<m_Display>0</m_Display>
</item>
<item class_id_reference="9" object_id="_52">
<Value>
<Obj>
<type>0</type>
<id>74</id>
<name/>
<fileName>dct.c</fileName>
<fileDirectory>..</fileDirectory>
<lineNumber>40</lineNumber>
<contextFuncName>dct_2d</contextFuncName>
<inlineStackInfo>
<count>1</count>
<item_version>0</item_version>
<item>
<first>/home/lfvelez/Documentos/ISPR/HLS/labsource/labs/lab3</first>
<second>
<count>1</count>
<item_version>0</item_version>
<item>
<first>
<first>dct.c</first>
<second>dct_2d</second>
</first>
<second>40</second>
</item>
</second>
</item>
</inlineStackInfo>
<originalName/>
<rtlName/>
<coreName/>
</Obj>
<bitwidth>0</bitwidth>
</Value>
<oprand_edges>
<count>2</count>
<item_version>0</item_version>
<item>386</item>
<item>387</item>
</oprand_edges>
<opcode>store</opcode>
<m_Display>0</m_Display>
</item>
<item class_id_reference="9" object_id="_53">
<Value>
<Obj>
<type>0</type>
<id>75</id>
<name/>
<fileName>dct.c</fileName>
<fileDirectory>..</fileDirectory>
<lineNumber>40</lineNumber>
<contextFuncName>dct_2d</contextFuncName>
<inlineStackInfo>
<count>1</count>
<item_version>0</item_version>
<item>
<first>/home/lfvelez/Documentos/ISPR/HLS/labsource/labs/lab3</first>
<second>
<count>1</count>
<item_version>0</item_version>
<item>
<first>
<first>dct.c</first>
<second>dct_2d</second>
</first>
<second>40</second>
</item>
</second>
</item>
</inlineStackInfo>
<originalName/>
<rtlName/>
<coreName/>
</Obj>
<bitwidth>0</bitwidth>
</Value>
<oprand_edges>
<count>1</count>
<item_version>0</item_version>
<item>388</item>
</oprand_edges>
<opcode>br</opcode>
<m_Display>0</m_Display>
</item>
<item class_id_reference="9" object_id="_54">
<Value>
<Obj>
<type>0</type>
<id>77</id>
<name>col_inbuf_4_addr</name>
<fileName>dct.c</fileName>
<fileDirectory>..</fileDirectory>
<lineNumber>40</lineNumber>
<contextFuncName>dct_2d</contextFuncName>
<inlineStackInfo>
<count>1</count>
<item_version>0</item_version>
<item>
<first>/home/lfvelez/Documentos/ISPR/HLS/labsource/labs/lab3</first>
<second>
<count>1</count>
<item_version>0</item_version>
<item>
<first>
<first>dct.c</first>
<second>dct_2d</second>
</first>
<second>40</second>
</item>
</second>
</item>
</inlineStackInfo>
<originalName/>
<rtlName/>
<coreName/>
</Obj>
<bitwidth>3</bitwidth>
</Value>
<oprand_edges>
<count>3</count>
<item_version>0</item_version>
<item>377</item>
<item>378</item>
<item>379</item>
</oprand_edges>
<opcode>getelementptr</opcode>
<m_Display>0</m_Display>
</item>
<item class_id_reference="9" object_id="_55">
<Value>
<Obj>
<type>0</type>
<id>78</id>
<name/>
<fileName>dct.c</fileName>
<fileDirectory>..</fileDirectory>
<lineNumber>40</lineNumber>
<contextFuncName>dct_2d</contextFuncName>
<inlineStackInfo>
<count>1</count>
<item_version>0</item_version>
<item>
<first>/home/lfvelez/Documentos/ISPR/HLS/labsource/labs/lab3</first>
<second>
<count>1</count>
<item_version>0</item_version>
<item>
<first>
<first>dct.c</first>
<second>dct_2d</second>
</first>
<second>40</second>
</item>
</second>
</item>
</inlineStackInfo>
<originalName/>
<rtlName/>
<coreName/>
</Obj>
<bitwidth>0</bitwidth>
</Value>
<oprand_edges>
<count>2</count>
<item_version>0</item_version>
<item>380</item>
<item>381</item>
</oprand_edges>
<opcode>store</opcode>
<m_Display>0</m_Display>
</item>
<item class_id_reference="9" object_id="_56">
<Value>
<Obj>
<type>0</type>
<id>79</id>
<name/>
<fileName>dct.c</fileName>
<fileDirectory>..</fileDirectory>
<lineNumber>40</lineNumber>
<contextFuncName>dct_2d</contextFuncName>
<inlineStackInfo>
<count>1</count>
<item_version>0</item_version>
<item>
<first>/home/lfvelez/Documentos/ISPR/HLS/labsource/labs/lab3</first>
<second>
<count>1</count>
<item_version>0</item_version>
<item>
<first>
<first>dct.c</first>
<second>dct_2d</second>
</first>
<second>40</second>
</item>
</second>
</item>
</inlineStackInfo>
<originalName/>
<rtlName/>
<coreName/>
</Obj>
<bitwidth>0</bitwidth>
</Value>
<oprand_edges>
<count>1</count>
<item_version>0</item_version>
<item>382</item>
</oprand_edges>
<opcode>br</opcode>
<m_Display>0</m_Display>
</item>
<item class_id_reference="9" object_id="_57">
<Value>
<Obj>
<type>0</type>
<id>81</id>
<name>col_inbuf_3_addr</name>
<fileName>dct.c</fileName>
<fileDirectory>..</fileDirectory>
<lineNumber>40</lineNumber>
<contextFuncName>dct_2d</contextFuncName>
<inlineStackInfo>
<count>1</count>
<item_version>0</item_version>
<item>
<first>/home/lfvelez/Documentos/ISPR/HLS/labsource/labs/lab3</first>
<second>
<count>1</count>
<item_version>0</item_version>
<item>
<first>
<first>dct.c</first>
<second>dct_2d</second>
</first>
<second>40</second>
</item>
</second>
</item>
</inlineStackInfo>
<originalName/>
<rtlName/>
<coreName/>
</Obj>
<bitwidth>3</bitwidth>
</Value>
<oprand_edges>
<count>3</count>
<item_version>0</item_version>
<item>371</item>
<item>372</item>
<item>373</item>
</oprand_edges>
<opcode>getelementptr</opcode>
<m_Display>0</m_Display>
</item>
<item class_id_reference="9" object_id="_58">
<Value>
<Obj>
<type>0</type>
<id>82</id>
<name/>
<fileName>dct.c</fileName>
<fileDirectory>..</fileDirectory>
<lineNumber>40</lineNumber>
<contextFuncName>dct_2d</contextFuncName>
<inlineStackInfo>
<count>1</count>
<item_version>0</item_version>
<item>
<first>/home/lfvelez/Documentos/ISPR/HLS/labsource/labs/lab3</first>
<second>
<count>1</count>
<item_version>0</item_version>
<item>
<first>
<first>dct.c</first>
<second>dct_2d</second>
</first>
<second>40</second>
</item>
</second>
</item>
</inlineStackInfo>
<originalName/>
<rtlName/>
<coreName/>
</Obj>
<bitwidth>0</bitwidth>
</Value>
<oprand_edges>
<count>2</count>
<item_version>0</item_version>
<item>374</item>
<item>375</item>
</oprand_edges>
<opcode>store</opcode>
<m_Display>0</m_Display>
</item>
<item class_id_reference="9" object_id="_59">
<Value>
<Obj>
<type>0</type>
<id>83</id>
<name/>
<fileName>dct.c</fileName>
<fileDirectory>..</fileDirectory>
<lineNumber>40</lineNumber>
<contextFuncName>dct_2d</contextFuncName>
<inlineStackInfo>
<count>1</count>
<item_version>0</item_version>
<item>
<first>/home/lfvelez/Documentos/ISPR/HLS/labsource/labs/lab3</first>
<second>
<count>1</count>
<item_version>0</item_version>
<item>
<first>
<first>dct.c</first>
<second>dct_2d</second>
</first>
<second>40</second>
</item>
</second>
</item>
</inlineStackInfo>
<originalName/>
<rtlName/>
<coreName/>
</Obj>
<bitwidth>0</bitwidth>
</Value>
<oprand_edges>
<count>1</count>
<item_version>0</item_version>
<item>376</item>
</oprand_edges>
<opcode>br</opcode>
<m_Display>0</m_Display>
</item>
<item class_id_reference="9" object_id="_60">
<Value>
<Obj>
<type>0</type>
<id>85</id>
<name>col_inbuf_2_addr</name>
<fileName>dct.c</fileName>
<fileDirectory>..</fileDirectory>
<lineNumber>40</lineNumber>
<contextFuncName>dct_2d</contextFuncName>
<inlineStackInfo>
<count>1</count>
<item_version>0</item_version>
<item>
<first>/home/lfvelez/Documentos/ISPR/HLS/labsource/labs/lab3</first>
<second>
<count>1</count>
<item_version>0</item_version>
<item>
<first>
<first>dct.c</first>
<second>dct_2d</second>
</first>
<second>40</second>
</item>
</second>
</item>
</inlineStackInfo>
<originalName/>
<rtlName/>
<coreName/>
</Obj>
<bitwidth>3</bitwidth>
</Value>
<oprand_edges>
<count>3</count>
<item_version>0</item_version>
<item>365</item>
<item>366</item>
<item>367</item>
</oprand_edges>
<opcode>getelementptr</opcode>
<m_Display>0</m_Display>
</item>
<item class_id_reference="9" object_id="_61">
<Value>
<Obj>
<type>0</type>
<id>86</id>
<name/>
<fileName>dct.c</fileName>
<fileDirectory>..</fileDirectory>
<lineNumber>40</lineNumber>
<contextFuncName>dct_2d</contextFuncName>
<inlineStackInfo>
<count>1</count>
<item_version>0</item_version>
<item>
<first>/home/lfvelez/Documentos/ISPR/HLS/labsource/labs/lab3</first>
<second>
<count>1</count>
<item_version>0</item_version>
<item>
<first>
<first>dct.c</first>
<second>dct_2d</second>
</first>
<second>40</second>
</item>
</second>
</item>
</inlineStackInfo>
<originalName/>
<rtlName/>
<coreName/>
</Obj>
<bitwidth>0</bitwidth>
</Value>
<oprand_edges>
<count>2</count>
<item_version>0</item_version>
<item>368</item>
<item>369</item>
</oprand_edges>
<opcode>store</opcode>
<m_Display>0</m_Display>
</item>
<item class_id_reference="9" object_id="_62">
<Value>
<Obj>
<type>0</type>
<id>87</id>
<name/>
<fileName>dct.c</fileName>
<fileDirectory>..</fileDirectory>
<lineNumber>40</lineNumber>
<contextFuncName>dct_2d</contextFuncName>
<inlineStackInfo>
<count>1</count>
<item_version>0</item_version>
<item>
<first>/home/lfvelez/Documentos/ISPR/HLS/labsource/labs/lab3</first>
<second>
<count>1</count>
<item_version>0</item_version>
<item>
<first>
<first>dct.c</first>
<second>dct_2d</second>
</first>
<second>40</second>
</item>
</second>
</item>
</inlineStackInfo>
<originalName/>
<rtlName/>
<coreName/>
</Obj>
<bitwidth>0</bitwidth>
</Value>
<oprand_edges>
<count>1</count>
<item_version>0</item_version>
<item>370</item>
</oprand_edges>
<opcode>br</opcode>
<m_Display>0</m_Display>
</item>
<item class_id_reference="9" object_id="_63">
<Value>
<Obj>
<type>0</type>
<id>89</id>
<name>col_inbuf_1_addr</name>
<fileName>dct.c</fileName>
<fileDirectory>..</fileDirectory>
<lineNumber>40</lineNumber>
<contextFuncName>dct_2d</contextFuncName>
<inlineStackInfo>
<count>1</count>
<item_version>0</item_version>
<item>
<first>/home/lfvelez/Documentos/ISPR/HLS/labsource/labs/lab3</first>
<second>
<count>1</count>
<item_version>0</item_version>
<item>
<first>
<first>dct.c</first>
<second>dct_2d</second>
</first>
<second>40</second>
</item>
</second>
</item>
</inlineStackInfo>
<originalName/>
<rtlName/>
<coreName/>
</Obj>
<bitwidth>3</bitwidth>
</Value>
<oprand_edges>
<count>3</count>
<item_version>0</item_version>
<item>359</item>
<item>360</item>
<item>361</item>
</oprand_edges>
<opcode>getelementptr</opcode>
<m_Display>0</m_Display>
</item>
<item class_id_reference="9" object_id="_64">
<Value>
<Obj>
<type>0</type>
<id>90</id>
<name/>
<fileName>dct.c</fileName>
<fileDirectory>..</fileDirectory>
<lineNumber>40</lineNumber>
<contextFuncName>dct_2d</contextFuncName>
<inlineStackInfo>
<count>1</count>
<item_version>0</item_version>
<item>
<first>/home/lfvelez/Documentos/ISPR/HLS/labsource/labs/lab3</first>
<second>
<count>1</count>
<item_version>0</item_version>
<item>
<first>
<first>dct.c</first>
<second>dct_2d</second>
</first>
<second>40</second>
</item>
</second>
</item>
</inlineStackInfo>
<originalName/>
<rtlName/>
<coreName/>
</Obj>
<bitwidth>0</bitwidth>
</Value>
<oprand_edges>
<count>2</count>
<item_version>0</item_version>
<item>362</item>
<item>363</item>
</oprand_edges>
<opcode>store</opcode>
<m_Display>0</m_Display>
</item>
<item class_id_reference="9" object_id="_65">
<Value>
<Obj>
<type>0</type>
<id>91</id>
<name/>
<fileName>dct.c</fileName>
<fileDirectory>..</fileDirectory>
<lineNumber>40</lineNumber>
<contextFuncName>dct_2d</contextFuncName>
<inlineStackInfo>
<count>1</count>
<item_version>0</item_version>
<item>
<first>/home/lfvelez/Documentos/ISPR/HLS/labsource/labs/lab3</first>
<second>
<count>1</count>
<item_version>0</item_version>
<item>
<first>
<first>dct.c</first>
<second>dct_2d</second>
</first>
<second>40</second>
</item>
</second>
</item>
</inlineStackInfo>
<originalName/>
<rtlName/>
<coreName/>
</Obj>
<bitwidth>0</bitwidth>
</Value>
<oprand_edges>
<count>1</count>
<item_version>0</item_version>
<item>364</item>
</oprand_edges>
<opcode>br</opcode>
<m_Display>0</m_Display>
</item>
<item class_id_reference="9" object_id="_66">
<Value>
<Obj>
<type>0</type>
<id>93</id>
<name>col_inbuf_0_addr</name>
<fileName>dct.c</fileName>
<fileDirectory>..</fileDirectory>
<lineNumber>40</lineNumber>
<contextFuncName>dct_2d</contextFuncName>
<inlineStackInfo>
<count>1</count>
<item_version>0</item_version>
<item>
<first>/home/lfvelez/Documentos/ISPR/HLS/labsource/labs/lab3</first>
<second>
<count>1</count>
<item_version>0</item_version>
<item>
<first>
<first>dct.c</first>
<second>dct_2d</second>
</first>
<second>40</second>
</item>
</second>
</item>
</inlineStackInfo>
<originalName/>
<rtlName/>
<coreName/>
</Obj>
<bitwidth>3</bitwidth>
</Value>
<oprand_edges>
<count>3</count>
<item_version>0</item_version>
<item>353</item>
<item>354</item>
<item>355</item>
</oprand_edges>
<opcode>getelementptr</opcode>
<m_Display>0</m_Display>
</item>
<item class_id_reference="9" object_id="_67">
<Value>
<Obj>
<type>0</type>
<id>94</id>
<name/>
<fileName>dct.c</fileName>
<fileDirectory>..</fileDirectory>
<lineNumber>40</lineNumber>
<contextFuncName>dct_2d</contextFuncName>
<inlineStackInfo>
<count>1</count>
<item_version>0</item_version>
<item>
<first>/home/lfvelez/Documentos/ISPR/HLS/labsource/labs/lab3</first>
<second>
<count>1</count>
<item_version>0</item_version>
<item>
<first>
<first>dct.c</first>
<second>dct_2d</second>
</first>
<second>40</second>
</item>
</second>
</item>
</inlineStackInfo>
<originalName/>
<rtlName/>
<coreName/>
</Obj>
<bitwidth>0</bitwidth>
</Value>
<oprand_edges>
<count>2</count>
<item_version>0</item_version>
<item>356</item>
<item>357</item>
</oprand_edges>
<opcode>store</opcode>
<m_Display>0</m_Display>
</item>
<item class_id_reference="9" object_id="_68">
<Value>
<Obj>
<type>0</type>
<id>95</id>
<name/>
<fileName>dct.c</fileName>
<fileDirectory>..</fileDirectory>
<lineNumber>40</lineNumber>
<contextFuncName>dct_2d</contextFuncName>
<inlineStackInfo>
<count>1</count>
<item_version>0</item_version>
<item>
<first>/home/lfvelez/Documentos/ISPR/HLS/labsource/labs/lab3</first>
<second>
<count>1</count>
<item_version>0</item_version>
<item>
<first>
<first>dct.c</first>
<second>dct_2d</second>
</first>
<second>40</second>
</item>
</second>
</item>
</inlineStackInfo>
<originalName/>
<rtlName/>
<coreName/>
</Obj>
<bitwidth>0</bitwidth>
</Value>
<oprand_edges>
<count>1</count>
<item_version>0</item_version>
<item>358</item>
</oprand_edges>
<opcode>br</opcode>
<m_Display>0</m_Display>
</item>
<item class_id_reference="9" object_id="_69">
<Value>
<Obj>
<type>0</type>
<id>97</id>
<name>col_inbuf_7_addr</name>
<fileName>dct.c</fileName>
<fileDirectory>..</fileDirectory>
<lineNumber>40</lineNumber>
<contextFuncName>dct_2d</contextFuncName>
<inlineStackInfo>
<count>1</count>
<item_version>0</item_version>
<item>
<first>/home/lfvelez/Documentos/ISPR/HLS/labsource/labs/lab3</first>
<second>
<count>1</count>
<item_version>0</item_version>
<item>
<first>
<first>dct.c</first>
<second>dct_2d</second>
</first>
<second>40</second>
</item>
</second>
</item>
</inlineStackInfo>
<originalName/>
<rtlName/>
<coreName/>
</Obj>
<bitwidth>3</bitwidth>
</Value>
<oprand_edges>
<count>3</count>
<item_version>0</item_version>
<item>395</item>
<item>396</item>
<item>397</item>
</oprand_edges>
<opcode>getelementptr</opcode>
<m_Display>0</m_Display>
</item>
<item class_id_reference="9" object_id="_70">
<Value>
<Obj>
<type>0</type>
<id>98</id>
<name/>
<fileName>dct.c</fileName>
<fileDirectory>..</fileDirectory>
<lineNumber>40</lineNumber>
<contextFuncName>dct_2d</contextFuncName>
<inlineStackInfo>
<count>1</count>
<item_version>0</item_version>
<item>
<first>/home/lfvelez/Documentos/ISPR/HLS/labsource/labs/lab3</first>
<second>
<count>1</count>
<item_version>0</item_version>
<item>
<first>
<first>dct.c</first>
<second>dct_2d</second>
</first>
<second>40</second>
</item>
</second>
</item>
</inlineStackInfo>
<originalName/>
<rtlName/>
<coreName/>
</Obj>
<bitwidth>0</bitwidth>
</Value>
<oprand_edges>
<count>2</count>
<item_version>0</item_version>
<item>398</item>
<item>399</item>
</oprand_edges>
<opcode>store</opcode>
<m_Display>0</m_Display>
</item>
<item class_id_reference="9" object_id="_71">
<Value>
<Obj>
<type>0</type>
<id>99</id>
<name/>
<fileName>dct.c</fileName>
<fileDirectory>..</fileDirectory>
<lineNumber>40</lineNumber>
<contextFuncName>dct_2d</contextFuncName>
<inlineStackInfo>
<count>1</count>
<item_version>0</item_version>
<item>
<first>/home/lfvelez/Documentos/ISPR/HLS/labsource/labs/lab3</first>
<second>
<count>1</count>
<item_version>0</item_version>
<item>
<first>
<first>dct.c</first>
<second>dct_2d</second>
</first>
<second>40</second>
</item>
</second>
</item>
</inlineStackInfo>
<originalName/>
<rtlName/>
<coreName/>
</Obj>
<bitwidth>0</bitwidth>
</Value>
<oprand_edges>
<count>1</count>
<item_version>0</item_version>
<item>400</item>
</oprand_edges>
<opcode>br</opcode>
<m_Display>0</m_Display>
</item>
<item class_id_reference="9" object_id="_72">
<Value>
<Obj>
<type>0</type>
<id>102</id>
<name>i_6</name>
<fileName>dct.c</fileName>
<fileDirectory>..</fileDirectory>
<lineNumber>39</lineNumber>
<contextFuncName>dct_2d</contextFuncName>
<inlineStackInfo>
<count>1</count>
<item_version>0</item_version>
<item>
<first>/home/lfvelez/Documentos/ISPR/HLS/labsource/labs/lab3</first>
<second>
<count>1</count>
<item_version>0</item_version>
<item>
<first>
<first>dct.c</first>
<second>dct_2d</second>
</first>
<second>39</second>
</item>
</second>
</item>
</inlineStackInfo>
<originalName>i</originalName>
<rtlName>i_6_fu_487_p2</rtlName>
<coreName/>
</Obj>
<bitwidth>4</bitwidth>
</Value>
<oprand_edges>
<count>2</count>
<item_version>0</item_version>
<item>219</item>
<item>220</item>
</oprand_edges>
<opcode>add</opcode>
<m_Display>0</m_Display>
</item>
<item class_id_reference="9" object_id="_73">
<Value>
<Obj>
<type>0</type>
<id>103</id>
<name/>
<fileName/>
<fileDirectory/>
<lineNumber>0</lineNumber>
<contextFuncName/>
<inlineStackInfo>
<count>0</count>
<item_version>0</item_version>
</inlineStackInfo>
<originalName/>
<rtlName/>
<coreName/>
</Obj>
<bitwidth>0</bitwidth>
</Value>
<oprand_edges>
<count>1</count>
<item_version>0</item_version>
<item>221</item>
</oprand_edges>
<opcode>br</opcode>
<m_Display>0</m_Display>
</item>
<item class_id_reference="9" object_id="_74">
<Value>
<Obj>
<type>0</type>
<id>105</id>
<name/>
<fileName>dct.c</fileName>
<fileDirectory>..</fileDirectory>
<lineNumber>43</lineNumber>
<contextFuncName>dct_2d</contextFuncName>
<inlineStackInfo>
<count>1</count>
<item_version>0</item_version>
<item>
<first>/home/lfvelez/Documentos/ISPR/HLS/labsource/labs/lab3</first>
<second>
<count>1</count>
<item_version>0</item_version>
<item>
<first>
<first>dct.c</first>
<second>dct_2d</second>
</first>
<second>43</second>
</item>
</second>
</item>
</inlineStackInfo>
<originalName/>
<rtlName/>
<coreName/>
</Obj>
<bitwidth>0</bitwidth>
</Value>
<oprand_edges>
<count>1</count>
<item_version>0</item_version>
<item>218</item>
</oprand_edges>
<opcode>br</opcode>
<m_Display>0</m_Display>
</item>
<item class_id_reference="9" object_id="_75">
<Value>
<Obj>
<type>0</type>
<id>107</id>
<name>i_2</name>
<fileName/>
<fileDirectory/>
<lineNumber>0</lineNumber>
<contextFuncName/>
<inlineStackInfo>
<count>0</count>
<item_version>0</item_version>
</inlineStackInfo>
<originalName>i</originalName>
<rtlName/>
<coreName/>
</Obj>
<bitwidth>4</bitwidth>
</Value>
<oprand_edges>
<count>4</count>
<item_version>0</item_version>
<item>271</item>
<item>272</item>
<item>273</item>
<item>274</item>
</oprand_edges>
<opcode>phi</opcode>
<m_Display>0</m_Display>
</item>
<item class_id_reference="9" object_id="_76">
<Value>
<Obj>
<type>0</type>
<id>108</id>
<name>tmp_4</name>
<fileName>dct.c</fileName>
<fileDirectory>..</fileDirectory>
<lineNumber>43</lineNumber>
<contextFuncName>dct_2d</contextFuncName>
<inlineStackInfo>
<count>1</count>
<item_version>0</item_version>
<item>
<first>/home/lfvelez/Documentos/ISPR/HLS/labsource/labs/lab3</first>
<second>
<count>1</count>
<item_version>0</item_version>
<item>
<first>
<first>dct.c</first>
<second>dct_2d</second>
</first>
<second>43</second>
</item>
</second>
</item>
</inlineStackInfo>
<originalName/>
<rtlName>tmp_4_fu_503_p2</rtlName>
<coreName/>
</Obj>
<bitwidth>1</bitwidth>
</Value>
<oprand_edges>
<count>2</count>
<item_version>0</item_version>
<item>275</item>
<item>276</item>
</oprand_edges>
<opcode>icmp</opcode>
<m_Display>0</m_Display>
</item>
<item class_id_reference="9" object_id="_77">
<Value>
<Obj>
<type>0</type>
<id>110</id>
<name>i_5</name>
<fileName>dct.c</fileName>
<fileDirectory>..</fileDirectory>
<lineNumber>43</lineNumber>
<contextFuncName>dct_2d</contextFuncName>
<inlineStackInfo>
<count>1</count>
<item_version>0</item_version>
<item>
<first>/home/lfvelez/Documentos/ISPR/HLS/labsource/labs/lab3</first>
<second>
<count>1</count>
<item_version>0</item_version>
<item>
<first>
<first>dct.c</first>
<second>dct_2d</second>
</first>
<second>43</second>
</item>
</second>
</item>
</inlineStackInfo>
<originalName>i</originalName>
<rtlName>i_5_fu_509_p2</rtlName>
<coreName/>
</Obj>
<bitwidth>4</bitwidth>
</Value>
<oprand_edges>
<count>2</count>
<item_version>0</item_version>
<item>277</item>
<item>278</item>
</oprand_edges>
<opcode>add</opcode>
<m_Display>0</m_Display>
</item>
<item class_id_reference="9" object_id="_78">
<Value>
<Obj>
<type>0</type>
<id>111</id>
<name/>
<fileName>dct.c</fileName>
<fileDirectory>..</fileDirectory>
<lineNumber>43</lineNumber>
<contextFuncName>dct_2d</contextFuncName>
<inlineStackInfo>
<count>1</count>
<item_version>0</item_version>
<item>
<first>/home/lfvelez/Documentos/ISPR/HLS/labsource/labs/lab3</first>
<second>
<count>1</count>
<item_version>0</item_version>
<item>
<first>
<first>dct.c</first>
<second>dct_2d</second>
</first>
<second>43</second>
</item>
</second>
</item>
</inlineStackInfo>
<originalName/>
<rtlName/>
<coreName/>
</Obj>
<bitwidth>0</bitwidth>
</Value>
<oprand_edges>
<count>3</count>
<item_version>0</item_version>
<item>279</item>
<item>280</item>
<item>281</item>
</oprand_edges>
<opcode>br</opcode>
<m_Display>0</m_Display>
</item>
<item class_id_reference="9" object_id="_79">
<Value>
<Obj>
<type>0</type>
<id>114</id>
<name/>
<fileName>dct.c</fileName>
<fileDirectory>..</fileDirectory>
<lineNumber>44</lineNumber>
<contextFuncName>dct_2d</contextFuncName>
<inlineStackInfo>
<count>1</count>
<item_version>0</item_version>
<item>
<first>/home/lfvelez/Documentos/ISPR/HLS/labsource/labs/lab3</first>
<second>
<count>1</count>
<item_version>0</item_version>
<item>
<first>
<first>dct.c</first>
<second>dct_2d</second>
</first>
<second>44</second>
</item>
</second>
</item>
</inlineStackInfo>
<originalName/>
<rtlName>grp_dct_1d_fu_363</rtlName>
<coreName/>
</Obj>
<bitwidth>0</bitwidth>
</Value>
<oprand_edges>
<count>20</count>
<item_version>0</item_version>
<item>283</item>
<item>284</item>
<item>285</item>
<item>286</item>
<item>287</item>
<item>288</item>
<item>289</item>
<item>290</item>
<item>291</item>
<item>292</item>
<item>293</item>
<item>294</item>
<item>409</item>
<item>410</item>
<item>411</item>
<item>412</item>
<item>413</item>
<item>414</item>
<item>415</item>
<item>416</item>
</oprand_edges>
<opcode>call</opcode>
<m_Display>0</m_Display>
</item>
<item class_id_reference="9" object_id="_80">
<Value>
<Obj>
<type>0</type>
<id>115</id>
<name/>
<fileName>dct.c</fileName>
<fileDirectory>..</fileDirectory>
<lineNumber>43</lineNumber>
<contextFuncName>dct_2d</contextFuncName>
<inlineStackInfo>
<count>1</count>
<item_version>0</item_version>
<item>
<first>/home/lfvelez/Documentos/ISPR/HLS/labsource/labs/lab3</first>
<second>
<count>1</count>
<item_version>0</item_version>
<item>
<first>
<first>dct.c</first>
<second>dct_2d</second>
</first>
<second>43</second>
</item>
</second>
</item>
</inlineStackInfo>
<originalName/>
<rtlName/>
<coreName/>
</Obj>
<bitwidth>0</bitwidth>
</Value>
<oprand_edges>
<count>1</count>
<item_version>0</item_version>
<item>295</item>
</oprand_edges>
<opcode>br</opcode>
<m_Display>0</m_Display>
</item>
<item class_id_reference="9" object_id="_81">
<Value>
<Obj>
<type>0</type>
<id>117</id>
<name/>
<fileName/>
<fileDirectory/>
<lineNumber>0</lineNumber>
<contextFuncName/>
<inlineStackInfo>
<count>0</count>
<item_version>0</item_version>
</inlineStackInfo>
<originalName/>
<rtlName/>
<coreName/>
</Obj>
<bitwidth>0</bitwidth>
</Value>
<oprand_edges>
<count>1</count>
<item_version>0</item_version>
<item>282</item>
</oprand_edges>
<opcode>br</opcode>
<m_Display>0</m_Display>
</item>
<item class_id_reference="9" object_id="_82">
<Value>
<Obj>
<type>0</type>
<id>119</id>
<name>indvar_flatten1</name>
<fileName/>
<fileDirectory/>
<lineNumber>0</lineNumber>
<contextFuncName/>
<inlineStackInfo>
<count>0</count>
<item_version>0</item_version>
</inlineStackInfo>
<originalName/>
<rtlName/>
<coreName/>
</Obj>
<bitwidth>7</bitwidth>
</Value>
<oprand_edges>
<count>4</count>
<item_version>0</item_version>
<item>296</item>
<item>297</item>
<item>298</item>
<item>299</item>
</oprand_edges>
<opcode>phi</opcode>
<m_Display>0</m_Display>
</item>
<item class_id_reference="9" object_id="_83">
<Value>
<Obj>
<type>0</type>
<id>120</id>
<name>j_1</name>
<fileName>dct.c</fileName>
<fileDirectory>..</fileDirectory>
<lineNumber>51</lineNumber>
<contextFuncName>dct_2d</contextFuncName>
<inlineStackInfo>
<count>1</count>
<item_version>0</item_version>
<item>
<first>/home/lfvelez/Documentos/ISPR/HLS/labsource/labs/lab3</first>
<second>
<count>1</count>
<item_version>0</item_version>
<item>
<first>
<first>dct.c</first>
<second>dct_2d</second>
</first>
<second>51</second>
</item>
</second>
</item>
</inlineStackInfo>
<originalName/>
<rtlName/>
<coreName/>
</Obj>
<bitwidth>4</bitwidth>
</Value>
<oprand_edges>
<count>4</count>
<item_version>0</item_version>
<item>300</item>
<item>301</item>
<item>302</item>
<item>303</item>
</oprand_edges>
<opcode>phi</opcode>
<m_Display>0</m_Display>
</item>
<item class_id_reference="9" object_id="_84">
<Value>
<Obj>
<type>0</type>
<id>121</id>
<name>i_3</name>
<fileName/>
<fileDirectory/>
<lineNumber>0</lineNumber>
<contextFuncName/>
<inlineStackInfo>
<count>0</count>
<item_version>0</item_version>
</inlineStackInfo>
<originalName>i</originalName>
<rtlName/>
<coreName/>
</Obj>
<bitwidth>4</bitwidth>
</Value>
<oprand_edges>
<count>4</count>
<item_version>0</item_version>
<item>304</item>
<item>305</item>
<item>306</item>
<item>307</item>
</oprand_edges>
<opcode>phi</opcode>
<m_Display>0</m_Display>
</item>
<item class_id_reference="9" object_id="_85">
<Value>
<Obj>
<type>0</type>
<id>122</id>
<name>exitcond_flatten1</name>
<fileName/>
<fileDirectory/>
<lineNumber>0</lineNumber>
<contextFuncName/>
<inlineStackInfo>
<count>0</count>
<item_version>0</item_version>
</inlineStackInfo>
<originalName/>
<rtlName>exitcond_flatten1_fu_515_p2</rtlName>
<coreName/>
</Obj>
<bitwidth>1</bitwidth>
</Value>
<oprand_edges>
<count>2</count>
<item_version>0</item_version>
<item>308</item>
<item>309</item>
</oprand_edges>
<opcode>icmp</opcode>
<m_Display>0</m_Display>
</item>
<item class_id_reference="9" object_id="_86">
<Value>
<Obj>
<type>0</type>
<id>123</id>
<name>indvar_flatten_next1</name>
<fileName/>
<fileDirectory/>
<lineNumber>0</lineNumber>
<contextFuncName/>
<inlineStackInfo>
<count>0</count>
<item_version>0</item_version>
</inlineStackInfo>
<originalName/>
<rtlName>indvar_flatten_next1_fu_521_p2</rtlName>
<coreName/>
</Obj>
<bitwidth>7</bitwidth>
</Value>
<oprand_edges>
<count>2</count>
<item_version>0</item_version>
<item>310</item>
<item>311</item>
</oprand_edges>
<opcode>add</opcode>
<m_Display>0</m_Display>
</item>
<item class_id_reference="9" object_id="_87">
<Value>
<Obj>
<type>0</type>
<id>124</id>
<name/>
<fileName/>
<fileDirectory/>
<lineNumber>0</lineNumber>
<contextFuncName/>
<inlineStackInfo>
<count>0</count>
<item_version>0</item_version>
</inlineStackInfo>
<originalName/>
<rtlName/>
<coreName/>
</Obj>
<bitwidth>0</bitwidth>
</Value>
<oprand_edges>
<count>3</count>
<item_version>0</item_version>
<item>312</item>
<item>313</item>
<item>314</item>
</oprand_edges>
<opcode>br</opcode>
<m_Display>0</m_Display>
</item>
<item class_id_reference="9" object_id="_88">
<Value>
<Obj>
<type>0</type>
<id>126</id>
<name>j_3</name>
<fileName>dct.c</fileName>
<fileDirectory>..</fileDirectory>
<lineNumber>48</lineNumber>
<contextFuncName>dct_2d</contextFuncName>
<inlineStackInfo>
<count>1</count>
<item_version>0</item_version>
<item>
<first>/home/lfvelez/Documentos/ISPR/HLS/labsource/labs/lab3</first>
<second>
<count>1</count>
<item_version>0</item_version>
<item>
<first>
<first>dct.c</first>
<second>dct_2d</second>
</first>
<second>48</second>
</item>
</second>
</item>
</inlineStackInfo>
<originalName>j</originalName>
<rtlName>j_3_fu_527_p2</rtlName>
<coreName/>
</Obj>
<bitwidth>4</bitwidth>
</Value>
<oprand_edges>
<count>2</count>
<item_version>0</item_version>
<item>315</item>
<item>316</item>
</oprand_edges>
<opcode>add</opcode>
<m_Display>0</m_Display>
</item>
<item class_id_reference="9" object_id="_89">
<Value>
<Obj>
<type>0</type>
<id>129</id>
<name>tmp_5</name>
<fileName>dct.c</fileName>
<fileDirectory>..</fileDirectory>
<lineNumber>50</lineNumber>
<contextFuncName>dct_2d</contextFuncName>
<inlineStackInfo>
<count>1</count>
<item_version>0</item_version>
<item>
<first>/home/lfvelez/Documentos/ISPR/HLS/labsource/labs/lab3</first>
<second>
<count>1</count>
<item_version>0</item_version>
<item>
<first>
<first>dct.c</first>
<second>dct_2d</second>
</first>
<second>50</second>
</item>
</second>
</item>
</inlineStackInfo>
<originalName/>
<rtlName>tmp_5_fu_533_p2</rtlName>
<coreName/>
</Obj>
<bitwidth>1</bitwidth>
</Value>
<oprand_edges>
<count>2</count>
<item_version>0</item_version>
<item>317</item>
<item>318</item>
</oprand_edges>
<opcode>icmp</opcode>
<m_Display>0</m_Display>
</item>
<item class_id_reference="9" object_id="_90">
<Value>
<Obj>
<type>0</type>
<id>130</id>
<name>i_3_mid2</name>
<fileName>dct.c</fileName>
<fileDirectory>..</fileDirectory>
<lineNumber>50</lineNumber>
<contextFuncName>dct_2d</contextFuncName>
<inlineStackInfo>
<count>1</count>
<item_version>0</item_version>
<item>
<first>/home/lfvelez/Documentos/ISPR/HLS/labsource/labs/lab3</first>
<second>
<count>1</count>
<item_version>0</item_version>
<item>
<first>
<first>dct.c</first>
<second>dct_2d</second>
</first>
<second>50</second>
</item>
</second>
</item>
</inlineStackInfo>
<originalName/>
<rtlName>i_3_mid2_fu_539_p3</rtlName>
<coreName/>
</Obj>
<bitwidth>4</bitwidth>
</Value>
<oprand_edges>
<count>3</count>
<item_version>0</item_version>
<item>319</item>
<item>320</item>
<item>321</item>
</oprand_edges>
<opcode>select</opcode>
<m_Display>0</m_Display>
</item>
<item class_id_reference="9" object_id="_91">
<Value>
<Obj>
<type>0</type>
<id>131</id>
<name>tmp_9_mid2_v</name>
<fileName>dct.c</fileName>
<fileDirectory>..</fileDirectory>
<lineNumber>51</lineNumber>
<contextFuncName>dct_2d</contextFuncName>
<inlineStackInfo>
<count>1</count>
<item_version>0</item_version>
<item>
<first>/home/lfvelez/Documentos/ISPR/HLS/labsource/labs/lab3</first>
<second>
<count>1</count>
<item_version>0</item_version>
<item>
<first>
<first>dct.c</first>
<second>dct_2d</second>
</first>
<second>51</second>
</item>
</second>
</item>
</inlineStackInfo>
<originalName/>
<rtlName>tmp_9_mid2_v_fu_547_p3</rtlName>
<coreName/>
</Obj>
<bitwidth>4</bitwidth>
</Value>
<oprand_edges>
<count>3</count>
<item_version>0</item_version>
<item>322</item>
<item>323</item>
<item>324</item>
</oprand_edges>
<opcode>select</opcode>
<m_Display>0</m_Display>
</item>
<item class_id_reference="9" object_id="_92">
<Value>
<Obj>
<type>0</type>
<id>132</id>
<name>tmp_9_mid2_cast</name>
<fileName>dct.c</fileName>
<fileDirectory>..</fileDirectory>
<lineNumber>51</lineNumber>
<contextFuncName>dct_2d</contextFuncName>
<inlineStackInfo>
<count>1</count>
<item_version>0</item_version>
<item>
<first>/home/lfvelez/Documentos/ISPR/HLS/labsource/labs/lab3</first>
<second>
<count>1</count>
<item_version>0</item_version>
<item>
<first>
<first>dct.c</first>
<second>dct_2d</second>
</first>
<second>51</second>
</item>
</second>
</item>
</inlineStackInfo>
<originalName/>
<rtlName>tmp_9_mid2_cast_fu_555_p1</rtlName>
<coreName/>
</Obj>
<bitwidth>8</bitwidth>
</Value>
<oprand_edges>
<count>1</count>
<item_version>0</item_version>
<item>325</item>
</oprand_edges>
<opcode>zext</opcode>
<m_Display>0</m_Display>
</item>
<item class_id_reference="9" object_id="_93">
<Value>
<Obj>
<type>0</type>
<id>133</id>
<name>tmp_7</name>
<fileName>dct.c</fileName>
<fileDirectory>..</fileDirectory>
<lineNumber>51</lineNumber>
<contextFuncName>dct_2d</contextFuncName>
<inlineStackInfo>
<count>1</count>
<item_version>0</item_version>
<item>
<first>/home/lfvelez/Documentos/ISPR/HLS/labsource/labs/lab3</first>
<second>
<count>1</count>
<item_version>0</item_version>
<item>
<first>
<first>dct.c</first>
<second>dct_2d</second>
</first>
<second>51</second>
</item>
</second>
</item>
</inlineStackInfo>
<originalName/>
<rtlName>tmp_7_fu_585_p3</rtlName>
<coreName/>
</Obj>
<bitwidth>7</bitwidth>
</Value>
<oprand_edges>
<count>3</count>
<item_version>0</item_version>
<item>326</item>
<item>327</item>
<item>328</item>
</oprand_edges>
<opcode>bitconcatenate</opcode>
<m_Display>0</m_Display>
</item>
<item class_id_reference="9" object_id="_94">
<Value>
<Obj>
<type>0</type>
<id>134</id>
<name>tmp_14_cast</name>
<fileName>dct.c</fileName>
<fileDirectory>..</fileDirectory>
<lineNumber>51</lineNumber>
<contextFuncName>dct_2d</contextFuncName>
<inlineStackInfo>
<count>1</count>
<item_version>0</item_version>
<item>
<first>/home/lfvelez/Documentos/ISPR/HLS/labsource/labs/lab3</first>
<second>
<count>1</count>
<item_version>0</item_version>
<item>
<first>
<first>dct.c</first>
<second>dct_2d</second>
</first>
<second>51</second>
</item>
</second>
</item>
</inlineStackInfo>
<originalName/>
<rtlName>tmp_14_cast_fu_592_p1</rtlName>
<coreName/>
</Obj>
<bitwidth>8</bitwidth>
</Value>
<oprand_edges>
<count>1</count>
<item_version>0</item_version>
<item>329</item>
</oprand_edges>
<opcode>zext</opcode>
<m_Display>0</m_Display>
</item>
<item class_id_reference="9" object_id="_95">
<Value>
<Obj>
<type>0</type>
<id>138</id>
<name>tmp_2_cast</name>
<fileName>dct.c</fileName>
<fileDirectory>..</fileDirectory>
<lineNumber>51</lineNumber>
<contextFuncName>dct_2d</contextFuncName>
<inlineStackInfo>
<count>1</count>
<item_version>0</item_version>
<item>
<first>/home/lfvelez/Documentos/ISPR/HLS/labsource/labs/lab3</first>
<second>
<count>1</count>
<item_version>0</item_version>
<item>
<first>
<first>dct.c</first>
<second>dct_2d</second>
</first>
<second>51</second>
</item>
</second>
</item>
</inlineStackInfo>
<originalName/>
<rtlName>tmp_2_cast_fu_596_p1</rtlName>
<coreName/>
</Obj>
<bitwidth>8</bitwidth>
</Value>
<oprand_edges>
<count>1</count>
<item_version>0</item_version>
<item>330</item>
</oprand_edges>
<opcode>zext</opcode>
<m_Display>0</m_Display>
</item>
<item class_id_reference="9" object_id="_96">
<Value>
<Obj>
<type>0</type>
<id>139</id>
<name>tmp_9</name>
<fileName>dct.c</fileName>
<fileDirectory>..</fileDirectory>
<lineNumber>51</lineNumber>
<contextFuncName>dct_2d</contextFuncName>
<inlineStackInfo>
<count>1</count>
<item_version>0</item_version>
<item>
<first>/home/lfvelez/Documentos/ISPR/HLS/labsource/labs/lab3</first>
<second>
<count>1</count>
<item_version>0</item_version>
<item>
<first>
<first>dct.c</first>
<second>dct_2d</second>
</first>
<second>51</second>
</item>
</second>
</item>
</inlineStackInfo>
<originalName/>
<rtlName>tmp_9_fu_599_p2</rtlName>
<coreName/>
</Obj>
<bitwidth>8</bitwidth>
</Value>
<oprand_edges>
<count>2</count>
<item_version>0</item_version>
<item>331</item>
<item>332</item>
</oprand_edges>
<opcode>add</opcode>
<m_Display>0</m_Display>
</item>
<item class_id_reference="9" object_id="_97">
<Value>
<Obj>
<type>0</type>
<id>140</id>
<name>tmp_15_cast</name>
<fileName>dct.c</fileName>
<fileDirectory>..</fileDirectory>
<lineNumber>51</lineNumber>
<contextFuncName>dct_2d</contextFuncName>
<inlineStackInfo>
<count>1</count>
<item_version>0</item_version>
<item>
<first>/home/lfvelez/Documentos/ISPR/HLS/labsource/labs/lab3</first>
<second>
<count>1</count>
<item_version>0</item_version>
<item>
<first>
<first>dct.c</first>
<second>dct_2d</second>
</first>
<second>51</second>
</item>
</second>
</item>
</inlineStackInfo>
<originalName/>
<rtlName>tmp_15_cast_fu_605_p1</rtlName>
<coreName/>
</Obj>
<bitwidth>64</bitwidth>
</Value>
<oprand_edges>
<count>1</count>
<item_version>0</item_version>
<item>333</item>
</oprand_edges>
<opcode>zext</opcode>
<m_Display>0</m_Display>
</item>
<item class_id_reference="9" object_id="_98">
<Value>
<Obj>
<type>0</type>
<id>141</id>
<name>out_block_addr</name>
<fileName>dct.c</fileName>
<fileDirectory>..</fileDirectory>
<lineNumber>51</lineNumber>
<contextFuncName>dct_2d</contextFuncName>
<inlineStackInfo>
<count>1</count>
<item_version>0</item_version>
<item>
<first>/home/lfvelez/Documentos/ISPR/HLS/labsource/labs/lab3</first>
<second>
<count>1</count>
<item_version>0</item_version>
<item>
<first>
<first>dct.c</first>
<second>dct_2d</second>
</first>
<second>51</second>
</item>
</second>
</item>
</inlineStackInfo>
<originalName/>
<rtlName/>
<coreName/>
</Obj>
<bitwidth>6</bitwidth>
</Value>
<oprand_edges>
<count>3</count>
<item_version>0</item_version>
<item>334</item>
<item>335</item>
<item>336</item>
</oprand_edges>
<opcode>getelementptr</opcode>
<m_Display>0</m_Display>
</item>
<item class_id_reference="9" object_id="_99">
<Value>
<Obj>
<type>0</type>
<id>142</id>
<name>tmp_10</name>
<fileName>dct.c</fileName>
<fileDirectory>..</fileDirectory>
<lineNumber>50</lineNumber>
<contextFuncName>dct_2d</contextFuncName>
<inlineStackInfo>
<count>1</count>
<item_version>0</item_version>
<item>
<first>/home/lfvelez/Documentos/ISPR/HLS/labsource/labs/lab3</first>
<second>
<count>1</count>
<item_version>0</item_version>
<item>
<first>
<first>dct.c</first>
<second>dct_2d</second>
</first>
<second>50</second>
</item>
</second>
</item>
</inlineStackInfo>
<originalName/>
<rtlName>tmp_10_fu_558_p3</rtlName>
<coreName/>
</Obj>
<bitwidth>7</bitwidth>
</Value>
<oprand_edges>
<count>3</count>
<item_version>0</item_version>
<item>337</item>
<item>338</item>
<item>339</item>
</oprand_edges>
<opcode>bitconcatenate</opcode>
<m_Display>0</m_Display>
</item>
<item class_id_reference="9" object_id="_100">
<Value>
<Obj>
<type>0</type>
<id>143</id>
<name>tmp_17_cast</name>
<fileName>dct.c</fileName>
<fileDirectory>..</fileDirectory>
<lineNumber>51</lineNumber>
<contextFuncName>dct_2d</contextFuncName>
<inlineStackInfo>
<count>1</count>
<item_version>0</item_version>
<item>
<first>/home/lfvelez/Documentos/ISPR/HLS/labsource/labs/lab3</first>
<second>
<count>1</count>
<item_version>0</item_version>
<item>
<first>
<first>dct.c</first>
<second>dct_2d</second>
</first>
<second>51</second>
</item>
</second>
</item>
</inlineStackInfo>
<originalName/>
<rtlName>tmp_17_cast_fu_565_p1</rtlName>
<coreName/>
</Obj>
<bitwidth>8</bitwidth>
</Value>
<oprand_edges>
<count>1</count>
<item_version>0</item_version>
<item>340</item>
</oprand_edges>
<opcode>zext</opcode>
<m_Display>0</m_Display>
</item>
<item class_id_reference="9" object_id="_101">
<Value>
<Obj>
<type>0</type>
<id>144</id>
<name>tmp_11</name>
<fileName>dct.c</fileName>
<fileDirectory>..</fileDirectory>
<lineNumber>51</lineNumber>
<contextFuncName>dct_2d</contextFuncName>
<inlineStackInfo>
<count>1</count>
<item_version>0</item_version>
<item>
<first>/home/lfvelez/Documentos/ISPR/HLS/labsource/labs/lab3</first>
<second>
<count>1</count>
<item_version>0</item_version>
<item>
<first>
<first>dct.c</first>
<second>dct_2d</second>
</first>
<second>51</second>
</item>
</second>
</item>
</inlineStackInfo>
<originalName/>
<rtlName>tmp_11_fu_569_p2</rtlName>
<coreName/>
</Obj>
<bitwidth>8</bitwidth>
</Value>
<oprand_edges>
<count>2</count>
<item_version>0</item_version>
<item>341</item>
<item>342</item>
</oprand_edges>
<opcode>add</opcode>
<m_Display>0</m_Display>
</item>
<item class_id_reference="9" object_id="_102">
<Value>
<Obj>
<type>0</type>
<id>145</id>
<name>tmp_18_cast</name>
<fileName>dct.c</fileName>
<fileDirectory>..</fileDirectory>
<lineNumber>51</lineNumber>
<contextFuncName>dct_2d</contextFuncName>
<inlineStackInfo>
<count>1</count>
<item_version>0</item_version>
<item>
<first>/home/lfvelez/Documentos/ISPR/HLS/labsource/labs/lab3</first>
<second>
<count>1</count>
<item_version>0</item_version>
<item>
<first>
<first>dct.c</first>
<second>dct_2d</second>
</first>
<second>51</second>
</item>
</second>
</item>
</inlineStackInfo>
<originalName/>
<rtlName>tmp_18_cast_fu_575_p1</rtlName>
<coreName/>
</Obj>
<bitwidth>64</bitwidth>
</Value>
<oprand_edges>
<count>1</count>
<item_version>0</item_version>
<item>343</item>
</oprand_edges>
<opcode>zext</opcode>
<m_Display>0</m_Display>
</item>
<item class_id_reference="9" object_id="_103">
<Value>
<Obj>
<type>0</type>
<id>146</id>
<name>col_outbuf_addr</name>
<fileName>dct.c</fileName>
<fileDirectory>..</fileDirectory>
<lineNumber>51</lineNumber>
<contextFuncName>dct_2d</contextFuncName>
<inlineStackInfo>
<count>1</count>
<item_version>0</item_version>
<item>
<first>/home/lfvelez/Documentos/ISPR/HLS/labsource/labs/lab3</first>
<second>
<count>1</count>
<item_version>0</item_version>
<item>
<first>
<first>dct.c</first>
<second>dct_2d</second>
</first>
<second>51</second>
</item>
</second>
</item>
</inlineStackInfo>
<originalName/>
<rtlName/>
<coreName/>
</Obj>
<bitwidth>6</bitwidth>
</Value>
<oprand_edges>
<count>3</count>
<item_version>0</item_version>
<item>344</item>
<item>345</item>
<item>346</item>
</oprand_edges>
<opcode>getelementptr</opcode>
<m_Display>0</m_Display>
</item>
<item class_id_reference="9" object_id="_104">
<Value>
<Obj>
<type>0</type>
<id>147</id>
<name>col_outbuf_load</name>
<fileName>dct.c</fileName>
<fileDirectory>..</fileDirectory>
<lineNumber>51</lineNumber>
<contextFuncName>dct_2d</contextFuncName>
<inlineStackInfo>
<count>1</count>
<item_version>0</item_version>
<item>
<first>/home/lfvelez/Documentos/ISPR/HLS/labsource/labs/lab3</first>
<second>
<count>1</count>
<item_version>0</item_version>
<item>
<first>
<first>dct.c</first>
<second>dct_2d</second>
</first>
<second>51</second>
</item>
</second>
</item>
</inlineStackInfo>
<originalName/>
<rtlName/>
<coreName/>
</Obj>
<bitwidth>16</bitwidth>
</Value>
<oprand_edges>
<count>1</count>
<item_version>0</item_version>
<item>347</item>
</oprand_edges>
<opcode>load</opcode>
<m_Display>0</m_Display>
</item>
<item class_id_reference="9" object_id="_105">
<Value>
<Obj>
<type>0</type>
<id>148</id>
<name/>
<fileName>dct.c</fileName>
<fileDirectory>..</fileDirectory>
<lineNumber>51</lineNumber>
<contextFuncName>dct_2d</contextFuncName>
<inlineStackInfo>
<count>1</count>
<item_version>0</item_version>
<item>
<first>/home/lfvelez/Documentos/ISPR/HLS/labsource/labs/lab3</first>
<second>
<count>1</count>
<item_version>0</item_version>
<item>
<first>
<first>dct.c</first>
<second>dct_2d</second>
</first>
<second>51</second>
</item>
</second>
</item>
</inlineStackInfo>
<originalName/>
<rtlName/>
<coreName/>
</Obj>
<bitwidth>0</bitwidth>
</Value>
<oprand_edges>
<count>2</count>
<item_version>0</item_version>
<item>348</item>
<item>349</item>
</oprand_edges>
<opcode>store</opcode>
<m_Display>0</m_Display>
</item>
<item class_id_reference="9" object_id="_106">
<Value>
<Obj>
<type>0</type>
<id>150</id>
<name>i_7</name>
<fileName>dct.c</fileName>
<fileDirectory>..</fileDirectory>
<lineNumber>50</lineNumber>
<contextFuncName>dct_2d</contextFuncName>
<inlineStackInfo>
<count>1</count>
<item_version>0</item_version>
<item>
<first>/home/lfvelez/Documentos/ISPR/HLS/labsource/labs/lab3</first>
<second>
<count>1</count>
<item_version>0</item_version>
<item>
<first>
<first>dct.c</first>
<second>dct_2d</second>
</first>
<second>50</second>
</item>
</second>
</item>
</inlineStackInfo>
<originalName>i</originalName>
<rtlName>i_7_fu_580_p2</rtlName>
<coreName/>
</Obj>
<bitwidth>4</bitwidth>
</Value>
<oprand_edges>
<count>2</count>
<item_version>0</item_version>
<item>350</item>
<item>351</item>
</oprand_edges>
<opcode>add</opcode>
<m_Display>0</m_Display>
</item>
<item class_id_reference="9" object_id="_107">
<Value>
<Obj>
<type>0</type>
<id>151</id>
<name/>
<fileName/>
<fileDirectory/>
<lineNumber>0</lineNumber>
<contextFuncName/>
<inlineStackInfo>
<count>0</count>
<item_version>0</item_version>
</inlineStackInfo>
<originalName/>
<rtlName/>
<coreName/>
</Obj>
<bitwidth>0</bitwidth>
</Value>
<oprand_edges>
<count>1</count>
<item_version>0</item_version>
<item>352</item>
</oprand_edges>
<opcode>br</opcode>
<m_Display>0</m_Display>
</item>
<item class_id_reference="9" object_id="_108">
<Value>
<Obj>
<type>0</type>
<id>153</id>
<name/>
<fileName>dct.c</fileName>
<fileDirectory>..</fileDirectory>
<lineNumber>52</lineNumber>
<contextFuncName>dct_2d</contextFuncName>
<inlineStackInfo>
<count>1</count>
<item_version>0</item_version>
<item>
<first>/home/lfvelez/Documentos/ISPR/HLS/labsource/labs/lab3</first>
<second>
<count>1</count>
<item_version>0</item_version>
<item>
<first>
<first>dct.c</first>
<second>dct_2d</second>
</first>
<second>52</second>
</item>
</second>
</item>
</inlineStackInfo>
<originalName/>
<rtlName/>
<coreName/>
</Obj>
<bitwidth>0</bitwidth>
</Value>
<oprand_edges>
<count>0</count>
<item_version>0</item_version>
</oprand_edges>
<opcode>ret</opcode>
<m_Display>0</m_Display>
</item>
</nodes>
<consts class_id="15" tracking_level="0" version="0">
<count>16</count>
<item_version>0</item_version>
<item class_id="16" tracking_level="1" version="0" object_id="_109">
<Value>
<Obj>
<type>2</type>
<id>155</id>
<name>empty</name>
<fileName/>
<fileDirectory/>
<lineNumber>0</lineNumber>
<contextFuncName/>
<inlineStackInfo>
<count>0</count>
<item_version>0</item_version>
</inlineStackInfo>
<originalName/>
<rtlName/>
<coreName/>
</Obj>
<bitwidth>64</bitwidth>
</Value>
<const_type>0</const_type>
<content>1</content>
</item>
<item class_id_reference="16" object_id="_110">
<Value>
<Obj>
<type>2</type>
<id>167</id>
<name>empty</name>
<fileName/>
<fileDirectory/>
<lineNumber>0</lineNumber>
<contextFuncName/>
<inlineStackInfo>
<count>0</count>
<item_version>0</item_version>
</inlineStackInfo>
<originalName/>
<rtlName/>
<coreName/>
</Obj>
<bitwidth>4</bitwidth>
</Value>
<const_type>0</const_type>
<content>0</content>
</item>
<item class_id_reference="16" object_id="_111">
<Value>
<Obj>
<type>2</type>
<id>173</id>
<name>empty</name>
<fileName/>
<fileDirectory/>
<lineNumber>0</lineNumber>
<contextFuncName/>
<inlineStackInfo>
<count>0</count>
<item_version>0</item_version>
</inlineStackInfo>
<originalName/>
<rtlName/>
<coreName/>
</Obj>
<bitwidth>4</bitwidth>
</Value>
<const_type>0</const_type>
<content>8</content>
</item>
<item class_id_reference="16" object_id="_112">
<Value>
<Obj>
<type>2</type>
<id>176</id>
<name>empty</name>
<fileName/>
<fileDirectory/>
<lineNumber>0</lineNumber>
<contextFuncName/>
<inlineStackInfo>
<count>0</count>
<item_version>0</item_version>
</inlineStackInfo>
<originalName/>
<rtlName/>
<coreName/>
</Obj>
<bitwidth>4</bitwidth>
</Value>
<const_type>0</const_type>
<content>1</content>
</item>
<item class_id_reference="16" object_id="_113">
<Value>
<Obj>
<type>2</type>
<id>182</id>
<name>dct_1d</name>
<fileName/>
<fileDirectory/>
<lineNumber>0</lineNumber>
<contextFuncName/>
<inlineStackInfo>
<count>0</count>
<item_version>0</item_version>
</inlineStackInfo>
<originalName/>
<rtlName/>
<coreName/>
</Obj>
<bitwidth>0</bitwidth>
</Value>
<const_type>6</const_type>
<content><constant:dct_1d></content>
</item>
<item class_id_reference="16" object_id="_114">
<Value>
<Obj>
<type>2</type>
<id>198</id>
<name>empty</name>
<fileName/>
<fileDirectory/>
<lineNumber>0</lineNumber>
<contextFuncName/>
<inlineStackInfo>
<count>0</count>
<item_version>0</item_version>
</inlineStackInfo>
<originalName/>
<rtlName/>
<coreName/>
</Obj>
<bitwidth>7</bitwidth>
</Value>
<const_type>0</const_type>
<content>0</content>
</item>
<item class_id_reference="16" object_id="_115">
<Value>
<Obj>
<type>2</type>
<id>210</id>
<name>empty</name>
<fileName/>
<fileDirectory/>
<lineNumber>0</lineNumber>
<contextFuncName/>
<inlineStackInfo>
<count>0</count>
<item_version>0</item_version>
</inlineStackInfo>
<originalName/>
<rtlName/>
<coreName/>
</Obj>
<bitwidth>7</bitwidth>
</Value>
<const_type>0</const_type>
<content>64</content>
</item>
<item class_id_reference="16" object_id="_116">
<Value>
<Obj>
<type>2</type>
<id>213</id>
<name>empty</name>
<fileName/>
<fileDirectory/>
<lineNumber>0</lineNumber>
<contextFuncName/>
<inlineStackInfo>
<count>0</count>
<item_version>0</item_version>
</inlineStackInfo>
<originalName/>
<rtlName/>
<coreName/>
</Obj>
<bitwidth>7</bitwidth>
</Value>
<const_type>0</const_type>
<content>1</content>
</item>
<item class_id_reference="16" object_id="_117">
<Value>
<Obj>
<type>2</type>
<id>237</id>
<name>empty</name>
<fileName/>
<fileDirectory/>
<lineNumber>0</lineNumber>
<contextFuncName/>
<inlineStackInfo>
<count>0</count>
<item_version>0</item_version>
</inlineStackInfo>
<originalName/>
<rtlName/>
<coreName/>
</Obj>
<bitwidth>3</bitwidth>
</Value>
<const_type>0</const_type>
<content>0</content>
</item>
<item class_id_reference="16" object_id="_118">
<Value>
<Obj>
<type>2</type>
<id>244</id>
<name>empty</name>
<fileName/>
<fileDirectory/>
<lineNumber>0</lineNumber>
<contextFuncName/>
<inlineStackInfo>
<count>0</count>
<item_version>0</item_version>
</inlineStackInfo>
<originalName/>
<rtlName/>
<coreName/>
</Obj>
<bitwidth>64</bitwidth>
</Value>
<const_type>0</const_type>
<content>0</content>
</item>
<item class_id_reference="16" object_id="_119">
<Value>
<Obj>
<type>2</type>
<id>253</id>
<name>empty</name>
<fileName/>
<fileDirectory/>
<lineNumber>0</lineNumber>
<contextFuncName/>
<inlineStackInfo>
<count>0</count>
<item_version>0</item_version>
</inlineStackInfo>
<originalName/>
<rtlName/>
<coreName/>
</Obj>
<bitwidth>3</bitwidth>
</Value>
<const_type>0</const_type>
<content>1</content>
</item>
<item class_id_reference="16" object_id="_120">
<Value>
<Obj>
<type>2</type>
<id>256</id>
<name>empty</name>
<fileName/>
<fileDirectory/>
<lineNumber>0</lineNumber>
<contextFuncName/>
<inlineStackInfo>
<count>0</count>
<item_version>0</item_version>
</inlineStackInfo>
<originalName/>
<rtlName/>
<coreName/>
</Obj>
<bitwidth>3</bitwidth>
</Value>
<const_type>0</const_type>
<content>2</content>
</item>
<item class_id_reference="16" object_id="_121">
<Value>
<Obj>
<type>2</type>
<id>259</id>
<name>empty</name>
<fileName/>
<fileDirectory/>
<lineNumber>0</lineNumber>
<contextFuncName/>
<inlineStackInfo>
<count>0</count>
<item_version>0</item_version>
</inlineStackInfo>
<originalName/>
<rtlName/>
<coreName/>
</Obj>
<bitwidth>3</bitwidth>
</Value>
<const_type>0</const_type>
<content>3</content>
</item>
<item class_id_reference="16" object_id="_122">
<Value>
<Obj>
<type>2</type>
<id>262</id>
<name>empty</name>
<fileName/>
<fileDirectory/>
<lineNumber>0</lineNumber>
<contextFuncName/>
<inlineStackInfo>
<count>0</count>
<item_version>0</item_version>
</inlineStackInfo>
<originalName/>
<rtlName/>
<coreName/>
</Obj>
<bitwidth>3</bitwidth>
</Value>
<const_type>0</const_type>
<content>4</content>
</item>
<item class_id_reference="16" object_id="_123">
<Value>
<Obj>
<type>2</type>
<id>265</id>
<name>empty</name>
<fileName/>
<fileDirectory/>
<lineNumber>0</lineNumber>
<contextFuncName/>
<inlineStackInfo>
<count>0</count>
<item_version>0</item_version>
</inlineStackInfo>
<originalName/>
<rtlName/>
<coreName/>
</Obj>
<bitwidth>3</bitwidth>
</Value>
<const_type>0</const_type>
<content>5</content>
</item>
<item class_id_reference="16" object_id="_124">
<Value>
<Obj>
<type>2</type>
<id>268</id>
<name>empty</name>
<fileName/>
<fileDirectory/>
<lineNumber>0</lineNumber>
<contextFuncName/>
<inlineStackInfo>
<count>0</count>
<item_version>0</item_version>
</inlineStackInfo>
<originalName/>
<rtlName/>
<coreName/>
</Obj>
<bitwidth>3</bitwidth>
</Value>
<const_type>0</const_type>
<content>6</content>
</item>
</consts>
<blocks class_id="17" tracking_level="0" version="0">
<count>22</count>
<item_version>0</item_version>
<item class_id="18" tracking_level="1" version="0" object_id="_125">
<Obj>
<type>3</type>
<id>29</id>
<name/>
<fileName/>
<fileDirectory/>
<lineNumber>0</lineNumber>
<contextFuncName/>
<inlineStackInfo>
<count>0</count>
<item_version>0</item_version>
</inlineStackInfo>
<originalName/>
<rtlName/>
<coreName/>
</Obj>
<node_objs>
<count>11</count>
<item_version>0</item_version>
<item>18</item>
<item>19</item>
<item>20</item>
<item>21</item>
<item>22</item>
<item>23</item>
<item>24</item>
<item>25</item>
<item>26</item>
<item>27</item>
<item>28</item>
</node_objs>
</item>
<item class_id_reference="18" object_id="_126">
<Obj>
<type>3</type>
<id>35</id>
<name/>
<fileName/>
<fileDirectory/>
<lineNumber>0</lineNumber>
<contextFuncName/>
<inlineStackInfo>
<count>0</count>
<item_version>0</item_version>
</inlineStackInfo>
<originalName/>
<rtlName/>
<coreName/>
</Obj>
<node_objs>
<count>4</count>
<item_version>0</item_version>
<item>30</item>
<item>31</item>
<item>33</item>
<item>34</item>
</node_objs>
</item>
<item class_id_reference="18" object_id="_127">
<Obj>
<type>3</type>
<id>39</id>
<name/>
<fileName/>
<fileDirectory/>
<lineNumber>0</lineNumber>
<contextFuncName/>
<inlineStackInfo>
<count>0</count>
<item_version>0</item_version>
</inlineStackInfo>
<originalName/>
<rtlName/>
<coreName/>
</Obj>
<node_objs>
<count>2</count>
<item_version>0</item_version>
<item>37</item>
<item>38</item>
</node_objs>
</item>
<item class_id_reference="18" object_id="_128">
<Obj>
<type>3</type>
<id>41</id>
<name>.preheader2.preheader.preheader</name>
<fileName/>
<fileDirectory/>
<lineNumber>0</lineNumber>
<contextFuncName/>
<inlineStackInfo>
<count>0</count>
<item_version>0</item_version>
</inlineStackInfo>
<originalName/>
<rtlName/>
<coreName/>
</Obj>
<node_objs>
<count>1</count>
<item_version>0</item_version>
<item>40</item>
</node_objs>
</item>
<item class_id_reference="18" object_id="_129">
<Obj>
<type>3</type>
<id>48</id>
<name>.preheader2.preheader</name>
<fileName/>
<fileDirectory/>
<lineNumber>0</lineNumber>
<contextFuncName/>
<inlineStackInfo>
<count>0</count>
<item_version>0</item_version>
</inlineStackInfo>
<originalName/>
<rtlName/>
<coreName/>
</Obj>
<node_objs>
<count>6</count>
<item_version>0</item_version>
<item>42</item>
<item>43</item>
<item>44</item>
<item>45</item>
<item>46</item>
<item>47</item>
</node_objs>
</item>
<item class_id_reference="18" object_id="_130">
<Obj>
<type>3</type>
<id>68</id>
<name>.preheader2</name>
<fileName/>
<fileDirectory/>
<lineNumber>0</lineNumber>
<contextFuncName/>
<inlineStackInfo>
<count>0</count>
<item_version>0</item_version>
</inlineStackInfo>
<originalName/>
<rtlName/>
<coreName/>
</Obj>
<node_objs>
<count>14</count>
<item_version>0</item_version>
<item>49</item>
<item>52</item>
<item>53</item>
<item>54</item>
<item>55</item>
<item>56</item>
<item>60</item>
<item>61</item>
<item>62</item>
<item>63</item>
<item>64</item>
<item>65</item>
<item>66</item>
<item>67</item>
</node_objs>
</item>
<item class_id_reference="18" object_id="_131">
<Obj>
<type>3</type>
<id>72</id>
<name>branch6</name>
<fileName/>
<fileDirectory/>
<lineNumber>0</lineNumber>
<contextFuncName/>
<inlineStackInfo>
<count>0</count>
<item_version>0</item_version>
</inlineStackInfo>
<originalName/>
<rtlName/>
<coreName/>
</Obj>
<node_objs>
<count>3</count>
<item_version>0</item_version>
<item>69</item>
<item>70</item>
<item>71</item>
</node_objs>
</item>
<item class_id_reference="18" object_id="_132">
<Obj>
<type>3</type>
<id>76</id>
<name>branch5</name>
<fileName/>
<fileDirectory/>
<lineNumber>0</lineNumber>
<contextFuncName/>
<inlineStackInfo>
<count>0</count>
<item_version>0</item_version>
</inlineStackInfo>
<originalName/>
<rtlName/>
<coreName/>
</Obj>
<node_objs>
<count>3</count>
<item_version>0</item_version>
<item>73</item>
<item>74</item>
<item>75</item>
</node_objs>
</item>
<item class_id_reference="18" object_id="_133">
<Obj>
<type>3</type>
<id>80</id>
<name>branch4</name>
<fileName/>
<fileDirectory/>
<lineNumber>0</lineNumber>
<contextFuncName/>
<inlineStackInfo>
<count>0</count>
<item_version>0</item_version>
</inlineStackInfo>
<originalName/>
<rtlName/>
<coreName/>
</Obj>
<node_objs>
<count>3</count>
<item_version>0</item_version>
<item>77</item>
<item>78</item>
<item>79</item>
</node_objs>
</item>
<item class_id_reference="18" object_id="_134">
<Obj>
<type>3</type>
<id>84</id>
<name>branch3</name>
<fileName/>
<fileDirectory/>
<lineNumber>0</lineNumber>
<contextFuncName/>
<inlineStackInfo>
<count>0</count>
<item_version>0</item_version>
</inlineStackInfo>
<originalName/>
<rtlName/>
<coreName/>
</Obj>
<node_objs>
<count>3</count>
<item_version>0</item_version>
<item>81</item>
<item>82</item>
<item>83</item>
</node_objs>
</item>
<item class_id_reference="18" object_id="_135">
<Obj>
<type>3</type>
<id>88</id>
<name>branch2</name>
<fileName/>
<fileDirectory/>
<lineNumber>0</lineNumber>
<contextFuncName/>
<inlineStackInfo>
<count>0</count>
<item_version>0</item_version>
</inlineStackInfo>
<originalName/>
<rtlName/>
<coreName/>
</Obj>
<node_objs>
<count>3</count>
<item_version>0</item_version>
<item>85</item>
<item>86</item>
<item>87</item>
</node_objs>
</item>
<item class_id_reference="18" object_id="_136">
<Obj>
<type>3</type>
<id>92</id>
<name>branch1</name>
<fileName/>
<fileDirectory/>
<lineNumber>0</lineNumber>
<contextFuncName/>
<inlineStackInfo>
<count>0</count>
<item_version>0</item_version>
</inlineStackInfo>
<originalName/>
<rtlName/>
<coreName/>
</Obj>
<node_objs>
<count>3</count>
<item_version>0</item_version>
<item>89</item>
<item>90</item>
<item>91</item>
</node_objs>
</item>
<item class_id_reference="18" object_id="_137">
<Obj>
<type>3</type>
<id>96</id>
<name>branch0</name>
<fileName/>
<fileDirectory/>
<lineNumber>0</lineNumber>
<contextFuncName/>
<inlineStackInfo>
<count>0</count>
<item_version>0</item_version>
</inlineStackInfo>
<originalName/>
<rtlName/>
<coreName/>
</Obj>
<node_objs>
<count>3</count>
<item_version>0</item_version>
<item>93</item>
<item>94</item>
<item>95</item>
</node_objs>
</item>
<item class_id_reference="18" object_id="_138">
<Obj>
<type>3</type>
<id>100</id>
<name>branch7</name>
<fileName/>
<fileDirectory/>
<lineNumber>0</lineNumber>
<contextFuncName/>
<inlineStackInfo>
<count>0</count>
<item_version>0</item_version>
</inlineStackInfo>
<originalName/>
<rtlName/>
<coreName/>
</Obj>
<node_objs>
<count>3</count>
<item_version>0</item_version>
<item>97</item>
<item>98</item>
<item>99</item>
</node_objs>
</item>
<item class_id_reference="18" object_id="_139">
<Obj>
<type>3</type>
<id>104</id>
<name>ifBlock</name>
<fileName/>
<fileDirectory/>
<lineNumber>0</lineNumber>
<contextFuncName/>
<inlineStackInfo>
<count>0</count>
<item_version>0</item_version>
</inlineStackInfo>
<originalName/>
<rtlName/>
<coreName/>
</Obj>
<node_objs>
<count>2</count>
<item_version>0</item_version>
<item>102</item>
<item>103</item>
</node_objs>
</item>
<item class_id_reference="18" object_id="_140">
<Obj>
<type>3</type>
<id>106</id>
<name>.preheader1.preheader</name>
<fileName/>
<fileDirectory/>
<lineNumber>0</lineNumber>
<contextFuncName/>
<inlineStackInfo>
<count>0</count>
<item_version>0</item_version>
</inlineStackInfo>
<originalName/>
<rtlName/>
<coreName/>
</Obj>
<node_objs>
<count>1</count>
<item_version>0</item_version>
<item>105</item>
</node_objs>
</item>
<item class_id_reference="18" object_id="_141">
<Obj>
<type>3</type>
<id>112</id>
<name>.preheader1</name>
<fileName/>
<fileDirectory/>
<lineNumber>0</lineNumber>
<contextFuncName/>
<inlineStackInfo>
<count>0</count>
<item_version>0</item_version>
</inlineStackInfo>
<originalName/>
<rtlName/>
<coreName/>
</Obj>
<node_objs>
<count>4</count>
<item_version>0</item_version>
<item>107</item>
<item>108</item>
<item>110</item>
<item>111</item>
</node_objs>
</item>
<item class_id_reference="18" object_id="_142">
<Obj>
<type>3</type>
<id>116</id>
<name/>
<fileName/>
<fileDirectory/>
<lineNumber>0</lineNumber>
<contextFuncName/>
<inlineStackInfo>
<count>0</count>
<item_version>0</item_version>
</inlineStackInfo>
<originalName/>
<rtlName/>
<coreName/>
</Obj>
<node_objs>
<count>2</count>
<item_version>0</item_version>
<item>114</item>
<item>115</item>
</node_objs>
</item>
<item class_id_reference="18" object_id="_143">
<Obj>
<type>3</type>
<id>118</id>
<name>.preheader.preheader.preheader</name>
<fileName/>
<fileDirectory/>
<lineNumber>0</lineNumber>
<contextFuncName/>
<inlineStackInfo>
<count>0</count>
<item_version>0</item_version>
</inlineStackInfo>
<originalName/>
<rtlName/>
<coreName/>
</Obj>
<node_objs>
<count>1</count>
<item_version>0</item_version>
<item>117</item>
</node_objs>
</item>
<item class_id_reference="18" object_id="_144">
<Obj>
<type>3</type>
<id>125</id>
<name>.preheader.preheader</name>
<fileName/>
<fileDirectory/>
<lineNumber>0</lineNumber>
<contextFuncName/>
<inlineStackInfo>
<count>0</count>
<item_version>0</item_version>
</inlineStackInfo>
<originalName/>
<rtlName/>
<coreName/>
</Obj>
<node_objs>
<count>6</count>
<item_version>0</item_version>
<item>119</item>
<item>120</item>
<item>121</item>
<item>122</item>
<item>123</item>
<item>124</item>
</node_objs>
</item>
<item class_id_reference="18" object_id="_145">
<Obj>
<type>3</type>
<id>152</id>
<name>.preheader</name>
<fileName/>
<fileDirectory/>
<lineNumber>0</lineNumber>
<contextFuncName/>
<inlineStackInfo>
<count>0</count>
<item_version>0</item_version>
</inlineStackInfo>
<originalName/>
<rtlName/>
<coreName/>
</Obj>
<node_objs>
<count>20</count>
<item_version>0</item_version>
<item>126</item>
<item>129</item>
<item>130</item>
<item>131</item>
<item>132</item>
<item>133</item>
<item>134</item>
<item>138</item>
<item>139</item>
<item>140</item>
<item>141</item>
<item>142</item>
<item>143</item>
<item>144</item>
<item>145</item>
<item>146</item>
<item>147</item>
<item>148</item>
<item>150</item>
<item>151</item>
</node_objs>
</item>
<item class_id_reference="18" object_id="_146">
<Obj>
<type>3</type>
<id>154</id>
<name/>
<fileName/>
<fileDirectory/>
<lineNumber>0</lineNumber>
<contextFuncName/>
<inlineStackInfo>
<count>0</count>
<item_version>0</item_version>
</inlineStackInfo>
<originalName/>
<rtlName/>
<coreName/>
</Obj>
<node_objs>
<count>1</count>
<item_version>0</item_version>
<item>153</item>
</node_objs>
</item>
</blocks>
<edges class_id="19" tracking_level="0" version="0">
<count>274</count>
<item_version>0</item_version>
<item class_id="20" tracking_level="1" version="0" object_id="_147">
<id>156</id>
<edge_type>1</edge_type>
<source_obj>155</source_obj>
<sink_obj>18</sink_obj>
</item>
<item class_id_reference="20" object_id="_148">
<id>157</id>
<edge_type>1</edge_type>
<source_obj>155</source_obj>
<sink_obj>19</sink_obj>
</item>
<item class_id_reference="20" object_id="_149">
<id>158</id>
<edge_type>1</edge_type>
<source_obj>155</source_obj>
<sink_obj>20</sink_obj>
</item>
<item class_id_reference="20" object_id="_150">
<id>159</id>
<edge_type>1</edge_type>
<source_obj>155</source_obj>
<sink_obj>21</sink_obj>
</item>
<item class_id_reference="20" object_id="_151">
<id>160</id>
<edge_type>1</edge_type>
<source_obj>155</source_obj>
<sink_obj>22</sink_obj>
</item>
<item class_id_reference="20" object_id="_152">
<id>161</id>
<edge_type>1</edge_type>
<source_obj>155</source_obj>
<sink_obj>23</sink_obj>
</item>
<item class_id_reference="20" object_id="_153">
<id>162</id>
<edge_type>1</edge_type>
<source_obj>155</source_obj>
<sink_obj>24</sink_obj>
</item>
<item class_id_reference="20" object_id="_154">
<id>163</id>
<edge_type>1</edge_type>
<source_obj>155</source_obj>
<sink_obj>25</sink_obj>
</item>
<item class_id_reference="20" object_id="_155">
<id>164</id>
<edge_type>1</edge_type>
<source_obj>155</source_obj>
<sink_obj>26</sink_obj>
</item>
<item class_id_reference="20" object_id="_156">
<id>165</id>
<edge_type>1</edge_type>
<source_obj>155</source_obj>
<sink_obj>27</sink_obj>
</item>
<item class_id_reference="20" object_id="_157">
<id>166</id>
<edge_type>2</edge_type>
<source_obj>35</source_obj>
<sink_obj>28</sink_obj>
</item>
<item class_id_reference="20" object_id="_158">
<id>168</id>
<edge_type>1</edge_type>
<source_obj>167</source_obj>
<sink_obj>30</sink_obj>
</item>
<item class_id_reference="20" object_id="_159">
<id>169</id>
<edge_type>2</edge_type>
<source_obj>29</source_obj>
<sink_obj>30</sink_obj>
</item>
<item class_id_reference="20" object_id="_160">
<id>170</id>
<edge_type>1</edge_type>
<source_obj>33</source_obj>
<sink_obj>30</sink_obj>
</item>
<item class_id_reference="20" object_id="_161">
<id>171</id>
<edge_type>2</edge_type>
<source_obj>39</source_obj>
<sink_obj>30</sink_obj>
</item>
<item class_id_reference="20" object_id="_162">
<id>172</id>
<edge_type>1</edge_type>
<source_obj>30</source_obj>
<sink_obj>31</sink_obj>
</item>
<item class_id_reference="20" object_id="_163">
<id>174</id>
<edge_type>1</edge_type>
<source_obj>173</source_obj>
<sink_obj>31</sink_obj>
</item>
<item class_id_reference="20" object_id="_164">
<id>175</id>
<edge_type>1</edge_type>
<source_obj>30</source_obj>
<sink_obj>33</sink_obj>
</item>
<item class_id_reference="20" object_id="_165">
<id>177</id>
<edge_type>1</edge_type>
<source_obj>176</source_obj>
<sink_obj>33</sink_obj>
</item>
<item class_id_reference="20" object_id="_166">
<id>178</id>
<edge_type>1</edge_type>
<source_obj>31</source_obj>
<sink_obj>34</sink_obj>
</item>
<item class_id_reference="20" object_id="_167">
<id>179</id>
<edge_type>2</edge_type>
<source_obj>39</source_obj>
<sink_obj>34</sink_obj>
</item>
<item class_id_reference="20" object_id="_168">
<id>180</id>
<edge_type>2</edge_type>
<source_obj>41</source_obj>
<sink_obj>34</sink_obj>
</item>
<item class_id_reference="20" object_id="_169">
<id>181</id>
<edge_type>2</edge_type>
<source_obj>48</source_obj>
<sink_obj>40</sink_obj>
</item>
<item class_id_reference="20" object_id="_170">
<id>183</id>
<edge_type>1</edge_type>
<source_obj>182</source_obj>
<sink_obj>37</sink_obj>
</item>
<item class_id_reference="20" object_id="_171">
<id>184</id>
<edge_type>1</edge_type>
<source_obj>1</source_obj>
<sink_obj>37</sink_obj>
</item>
<item class_id_reference="20" object_id="_172">
<id>185</id>
<edge_type>1</edge_type>
<source_obj>2</source_obj>
<sink_obj>37</sink_obj>
</item>
<item class_id_reference="20" object_id="_173">
<id>186</id>
<edge_type>1</edge_type>
<source_obj>3</source_obj>
<sink_obj>37</sink_obj>
</item>
<item class_id_reference="20" object_id="_174">
<id>187</id>
<edge_type>1</edge_type>
<source_obj>4</source_obj>
<sink_obj>37</sink_obj>
</item>
<item class_id_reference="20" object_id="_175">
<id>188</id>
<edge_type>1</edge_type>
<source_obj>5</source_obj>
<sink_obj>37</sink_obj>
</item>
<item class_id_reference="20" object_id="_176">
<id>189</id>
<edge_type>1</edge_type>
<source_obj>6</source_obj>
<sink_obj>37</sink_obj>
</item>
<item class_id_reference="20" object_id="_177">
<id>190</id>
<edge_type>1</edge_type>
<source_obj>7</source_obj>
<sink_obj>37</sink_obj>
</item>
<item class_id_reference="20" object_id="_178">
<id>191</id>
<edge_type>1</edge_type>
<source_obj>8</source_obj>
<sink_obj>37</sink_obj>
</item>
<item class_id_reference="20" object_id="_179">
<id>192</id>
<edge_type>1</edge_type>
<source_obj>30</source_obj>
<sink_obj>37</sink_obj>
</item>
<item class_id_reference="20" object_id="_180">
<id>193</id>
<edge_type>1</edge_type>
<source_obj>18</source_obj>
<sink_obj>37</sink_obj>
</item>
<item class_id_reference="20" object_id="_181">
<id>194</id>
<edge_type>1</edge_type>
<source_obj>30</source_obj>
<sink_obj>37</sink_obj>
</item>
<item class_id_reference="20" object_id="_182">
<id>195</id>
<edge_type>2</edge_type>
<source_obj>35</source_obj>
<sink_obj>38</sink_obj>
</item>
<item class_id_reference="20" object_id="_183">
<id>196</id>
<edge_type>1</edge_type>
<source_obj>46</source_obj>
<sink_obj>42</sink_obj>
</item>
<item class_id_reference="20" object_id="_184">
<id>197</id>
<edge_type>2</edge_type>
<source_obj>104</source_obj>
<sink_obj>42</sink_obj>
</item>
<item class_id_reference="20" object_id="_185">
<id>199</id>
<edge_type>1</edge_type>
<source_obj>198</source_obj>
<sink_obj>42</sink_obj>
</item>
<item class_id_reference="20" object_id="_186">
<id>200</id>
<edge_type>2</edge_type>
<source_obj>41</source_obj>
<sink_obj>42</sink_obj>
</item>
<item class_id_reference="20" object_id="_187">
<id>201</id>
<edge_type>1</edge_type>
<source_obj>54</source_obj>
<sink_obj>43</sink_obj>
</item>
<item class_id_reference="20" object_id="_188">
<id>202</id>
<edge_type>2</edge_type>
<source_obj>104</source_obj>
<sink_obj>43</sink_obj>
</item>
<item class_id_reference="20" object_id="_189">
<id>203</id>
<edge_type>1</edge_type>
<source_obj>167</source_obj>
<sink_obj>43</sink_obj>
</item>
<item class_id_reference="20" object_id="_190">
<id>204</id>
<edge_type>2</edge_type>
<source_obj>41</source_obj>
<sink_obj>43</sink_obj>
</item>
<item class_id_reference="20" object_id="_191">
<id>205</id>
<edge_type>1</edge_type>
<source_obj>102</source_obj>
<sink_obj>44</sink_obj>
</item>
<item class_id_reference="20" object_id="_192">
<id>206</id>
<edge_type>2</edge_type>
<source_obj>104</source_obj>
<sink_obj>44</sink_obj>
</item>
<item class_id_reference="20" object_id="_193">
<id>207</id>
<edge_type>1</edge_type>
<source_obj>167</source_obj>
<sink_obj>44</sink_obj>
</item>
<item class_id_reference="20" object_id="_194">
<id>208</id>
<edge_type>2</edge_type>
<source_obj>41</source_obj>
<sink_obj>44</sink_obj>
</item>
<item class_id_reference="20" object_id="_195">
<id>209</id>
<edge_type>1</edge_type>
<source_obj>42</source_obj>
<sink_obj>45</sink_obj>
</item>
<item class_id_reference="20" object_id="_196">
<id>211</id>
<edge_type>1</edge_type>
<source_obj>210</source_obj>
<sink_obj>45</sink_obj>
</item>
<item class_id_reference="20" object_id="_197">
<id>212</id>
<edge_type>1</edge_type>
<source_obj>42</source_obj>
<sink_obj>46</sink_obj>
</item>
<item class_id_reference="20" object_id="_198">
<id>214</id>
<edge_type>1</edge_type>
<source_obj>213</source_obj>
<sink_obj>46</sink_obj>
</item>
<item class_id_reference="20" object_id="_199">
<id>215</id>
<edge_type>1</edge_type>
<source_obj>45</source_obj>
<sink_obj>47</sink_obj>
</item>
<item class_id_reference="20" object_id="_200">
<id>216</id>
<edge_type>2</edge_type>
<source_obj>68</source_obj>
<sink_obj>47</sink_obj>
</item>
<item class_id_reference="20" object_id="_201">
<id>217</id>
<edge_type>2</edge_type>
<source_obj>106</source_obj>
<sink_obj>47</sink_obj>
</item>
<item class_id_reference="20" object_id="_202">
<id>218</id>
<edge_type>2</edge_type>
<source_obj>112</source_obj>
<sink_obj>105</sink_obj>
</item>
<item class_id_reference="20" object_id="_203">
<id>219</id>
<edge_type>1</edge_type>
<source_obj>53</source_obj>
<sink_obj>102</sink_obj>
</item>
<item class_id_reference="20" object_id="_204">
<id>220</id>
<edge_type>1</edge_type>
<source_obj>176</source_obj>
<sink_obj>102</sink_obj>
</item>
<item class_id_reference="20" object_id="_205">
<id>221</id>
<edge_type>2</edge_type>
<source_obj>48</source_obj>
<sink_obj>103</sink_obj>
</item>
<item class_id_reference="20" object_id="_206">
<id>222</id>
<edge_type>1</edge_type>
<source_obj>176</source_obj>
<sink_obj>49</sink_obj>
</item>
<item class_id_reference="20" object_id="_207">
<id>223</id>
<edge_type>1</edge_type>
<source_obj>43</source_obj>
<sink_obj>49</sink_obj>
</item>
<item class_id_reference="20" object_id="_208">
<id>224</id>
<edge_type>1</edge_type>
<source_obj>44</source_obj>
<sink_obj>52</sink_obj>
</item>
<item class_id_reference="20" object_id="_209">
<id>225</id>
<edge_type>1</edge_type>
<source_obj>173</source_obj>
<sink_obj>52</sink_obj>
</item>
<item class_id_reference="20" object_id="_210">
<id>226</id>
<edge_type>1</edge_type>
<source_obj>52</source_obj>
<sink_obj>53</sink_obj>
</item>
<item class_id_reference="20" object_id="_211">
<id>227</id>
<edge_type>1</edge_type>
<source_obj>167</source_obj>
<sink_obj>53</sink_obj>
</item>
<item class_id_reference="20" object_id="_212">
<id>228</id>
<edge_type>1</edge_type>
<source_obj>44</source_obj>
<sink_obj>53</sink_obj>
</item>
<item class_id_reference="20" object_id="_213">
<id>229</id>
<edge_type>1</edge_type>
<source_obj>52</source_obj>
<sink_obj>54</sink_obj>
</item>
<item class_id_reference="20" object_id="_214">
<id>230</id>
<edge_type>1</edge_type>
<source_obj>49</source_obj>
<sink_obj>54</sink_obj>
</item>
<item class_id_reference="20" object_id="_215">
<id>231</id>
<edge_type>1</edge_type>
<source_obj>43</source_obj>
<sink_obj>54</sink_obj>
</item>
<item class_id_reference="20" object_id="_216">
<id>232</id>
<edge_type>1</edge_type>
<source_obj>54</source_obj>
<sink_obj>55</sink_obj>
</item>
<item class_id_reference="20" object_id="_217">
<id>233</id>
<edge_type>1</edge_type>
<source_obj>54</source_obj>
<sink_obj>56</sink_obj>
</item>
<item class_id_reference="20" object_id="_218">
<id>236</id>
<edge_type>1</edge_type>
<source_obj>53</source_obj>
<sink_obj>60</sink_obj>
</item>
<item class_id_reference="20" object_id="_219">
<id>238</id>
<edge_type>1</edge_type>
<source_obj>237</source_obj>
<sink_obj>60</sink_obj>
</item>
<item class_id_reference="20" object_id="_220">
<id>239</id>
<edge_type>1</edge_type>
<source_obj>60</source_obj>
<sink_obj>61</sink_obj>
</item>
<item class_id_reference="20" object_id="_221">
<id>240</id>
<edge_type>1</edge_type>
<source_obj>61</source_obj>
<sink_obj>62</sink_obj>
</item>
<item class_id_reference="20" object_id="_222">
<id>241</id>
<edge_type>1</edge_type>
<source_obj>56</source_obj>
<sink_obj>62</sink_obj>
</item>
<item class_id_reference="20" object_id="_223">
<id>242</id>
<edge_type>1</edge_type>
<source_obj>62</source_obj>
<sink_obj>63</sink_obj>
</item>
<item class_id_reference="20" object_id="_224">
<id>243</id>
<edge_type>1</edge_type>
<source_obj>18</source_obj>
<sink_obj>64</sink_obj>
</item>
<item class_id_reference="20" object_id="_225">
<id>245</id>
<edge_type>1</edge_type>
<source_obj>244</source_obj>
<sink_obj>64</sink_obj>
</item>
<item class_id_reference="20" object_id="_226">
<id>246</id>
<edge_type>1</edge_type>
<source_obj>63</source_obj>
<sink_obj>64</sink_obj>
</item>
<item class_id_reference="20" object_id="_227">
<id>247</id>
<edge_type>1</edge_type>
<source_obj>64</source_obj>
<sink_obj>65</sink_obj>
</item>
<item class_id_reference="20" object_id="_228">
<id>248</id>
<edge_type>1</edge_type>
<source_obj>53</source_obj>
<sink_obj>66</sink_obj>
</item>
<item class_id_reference="20" object_id="_229">
<id>249</id>
<edge_type>1</edge_type>
<source_obj>66</source_obj>
<sink_obj>67</sink_obj>
</item>
<item class_id_reference="20" object_id="_230">
<id>250</id>
<edge_type>2</edge_type>
<source_obj>100</source_obj>
<sink_obj>67</sink_obj>
</item>
<item class_id_reference="20" object_id="_231">
<id>251</id>
<edge_type>1</edge_type>
<source_obj>237</source_obj>
<sink_obj>67</sink_obj>
</item>
<item class_id_reference="20" object_id="_232">
<id>252</id>
<edge_type>2</edge_type>
<source_obj>96</source_obj>
<sink_obj>67</sink_obj>
</item>
<item class_id_reference="20" object_id="_233">
<id>254</id>
<edge_type>1</edge_type>
<source_obj>253</source_obj>
<sink_obj>67</sink_obj>
</item>
<item class_id_reference="20" object_id="_234">
<id>255</id>
<edge_type>2</edge_type>
<source_obj>92</source_obj>
<sink_obj>67</sink_obj>
</item>
<item class_id_reference="20" object_id="_235">
<id>257</id>
<edge_type>1</edge_type>
<source_obj>256</source_obj>
<sink_obj>67</sink_obj>
</item>
<item class_id_reference="20" object_id="_236">
<id>258</id>
<edge_type>2</edge_type>
<source_obj>88</source_obj>
<sink_obj>67</sink_obj>
</item>
<item class_id_reference="20" object_id="_237">
<id>260</id>
<edge_type>1</edge_type>
<source_obj>259</source_obj>
<sink_obj>67</sink_obj>
</item>
<item class_id_reference="20" object_id="_238">
<id>261</id>
<edge_type>2</edge_type>
<source_obj>84</source_obj>
<sink_obj>67</sink_obj>
</item>
<item class_id_reference="20" object_id="_239">
<id>263</id>
<edge_type>1</edge_type>
<source_obj>262</source_obj>
<sink_obj>67</sink_obj>
</item>
<item class_id_reference="20" object_id="_240">
<id>264</id>
<edge_type>2</edge_type>
<source_obj>80</source_obj>
<sink_obj>67</sink_obj>
</item>
<item class_id_reference="20" object_id="_241">
<id>266</id>
<edge_type>1</edge_type>
<source_obj>265</source_obj>
<sink_obj>67</sink_obj>
</item>
<item class_id_reference="20" object_id="_242">
<id>267</id>
<edge_type>2</edge_type>
<source_obj>76</source_obj>
<sink_obj>67</sink_obj>
</item>
<item class_id_reference="20" object_id="_243">
<id>269</id>
<edge_type>1</edge_type>
<source_obj>268</source_obj>
<sink_obj>67</sink_obj>
</item>
<item class_id_reference="20" object_id="_244">
<id>270</id>
<edge_type>2</edge_type>
<source_obj>72</source_obj>
<sink_obj>67</sink_obj>
</item>
<item class_id_reference="20" object_id="_245">
<id>271</id>
<edge_type>1</edge_type>
<source_obj>110</source_obj>
<sink_obj>107</sink_obj>
</item>
<item class_id_reference="20" object_id="_246">
<id>272</id>
<edge_type>2</edge_type>
<source_obj>116</source_obj>
<sink_obj>107</sink_obj>
</item>
<item class_id_reference="20" object_id="_247">
<id>273</id>
<edge_type>1</edge_type>
<source_obj>167</source_obj>
<sink_obj>107</sink_obj>
</item>
<item class_id_reference="20" object_id="_248">
<id>274</id>
<edge_type>2</edge_type>
<source_obj>106</source_obj>
<sink_obj>107</sink_obj>
</item>
<item class_id_reference="20" object_id="_249">
<id>275</id>
<edge_type>1</edge_type>
<source_obj>107</source_obj>
<sink_obj>108</sink_obj>
</item>
<item class_id_reference="20" object_id="_250">
<id>276</id>
<edge_type>1</edge_type>
<source_obj>173</source_obj>
<sink_obj>108</sink_obj>
</item>
<item class_id_reference="20" object_id="_251">
<id>277</id>
<edge_type>1</edge_type>
<source_obj>107</source_obj>
<sink_obj>110</sink_obj>
</item>
<item class_id_reference="20" object_id="_252">
<id>278</id>
<edge_type>1</edge_type>
<source_obj>176</source_obj>
<sink_obj>110</sink_obj>
</item>
<item class_id_reference="20" object_id="_253">
<id>279</id>
<edge_type>1</edge_type>
<source_obj>108</source_obj>
<sink_obj>111</sink_obj>
</item>
<item class_id_reference="20" object_id="_254">
<id>280</id>
<edge_type>2</edge_type>
<source_obj>116</source_obj>
<sink_obj>111</sink_obj>
</item>
<item class_id_reference="20" object_id="_255">
<id>281</id>
<edge_type>2</edge_type>
<source_obj>118</source_obj>
<sink_obj>111</sink_obj>
</item>
<item class_id_reference="20" object_id="_256">
<id>282</id>
<edge_type>2</edge_type>
<source_obj>125</source_obj>
<sink_obj>117</sink_obj>
</item>
<item class_id_reference="20" object_id="_257">
<id>283</id>
<edge_type>1</edge_type>
<source_obj>182</source_obj>
<sink_obj>114</sink_obj>
</item>
<item class_id_reference="20" object_id="_258">
<id>284</id>
<edge_type>1</edge_type>
<source_obj>20</source_obj>
<sink_obj>114</sink_obj>
</item>
<item class_id_reference="20" object_id="_259">
<id>285</id>
<edge_type>1</edge_type>
<source_obj>21</source_obj>
<sink_obj>114</sink_obj>
</item>
<item class_id_reference="20" object_id="_260">
<id>286</id>
<edge_type>1</edge_type>
<source_obj>22</source_obj>
<sink_obj>114</sink_obj>
</item>
<item class_id_reference="20" object_id="_261">
<id>287</id>
<edge_type>1</edge_type>
<source_obj>23</source_obj>
<sink_obj>114</sink_obj>
</item>
<item class_id_reference="20" object_id="_262">
<id>288</id>
<edge_type>1</edge_type>
<source_obj>24</source_obj>
<sink_obj>114</sink_obj>
</item>
<item class_id_reference="20" object_id="_263">
<id>289</id>
<edge_type>1</edge_type>
<source_obj>25</source_obj>
<sink_obj>114</sink_obj>
</item>
<item class_id_reference="20" object_id="_264">
<id>290</id>
<edge_type>1</edge_type>
<source_obj>26</source_obj>
<sink_obj>114</sink_obj>
</item>
<item class_id_reference="20" object_id="_265">
<id>291</id>
<edge_type>1</edge_type>
<source_obj>27</source_obj>
<sink_obj>114</sink_obj>
</item>
<item class_id_reference="20" object_id="_266">
<id>292</id>
<edge_type>1</edge_type>
<source_obj>107</source_obj>
<sink_obj>114</sink_obj>
</item>
<item class_id_reference="20" object_id="_267">
<id>293</id>
<edge_type>1</edge_type>
<source_obj>19</source_obj>
<sink_obj>114</sink_obj>
</item>
<item class_id_reference="20" object_id="_268">
<id>294</id>
<edge_type>1</edge_type>
<source_obj>107</source_obj>
<sink_obj>114</sink_obj>
</item>
<item class_id_reference="20" object_id="_269">
<id>295</id>
<edge_type>2</edge_type>
<source_obj>112</source_obj>
<sink_obj>115</sink_obj>
</item>
<item class_id_reference="20" object_id="_270">
<id>296</id>
<edge_type>1</edge_type>
<source_obj>123</source_obj>
<sink_obj>119</sink_obj>
</item>
<item class_id_reference="20" object_id="_271">
<id>297</id>
<edge_type>2</edge_type>
<source_obj>152</source_obj>
<sink_obj>119</sink_obj>
</item>
<item class_id_reference="20" object_id="_272">
<id>298</id>
<edge_type>1</edge_type>
<source_obj>198</source_obj>
<sink_obj>119</sink_obj>
</item>
<item class_id_reference="20" object_id="_273">
<id>299</id>
<edge_type>2</edge_type>
<source_obj>118</source_obj>
<sink_obj>119</sink_obj>
</item>
<item class_id_reference="20" object_id="_274">
<id>300</id>
<edge_type>1</edge_type>
<source_obj>131</source_obj>
<sink_obj>120</sink_obj>
</item>
<item class_id_reference="20" object_id="_275">
<id>301</id>
<edge_type>2</edge_type>
<source_obj>152</source_obj>
<sink_obj>120</sink_obj>
</item>
<item class_id_reference="20" object_id="_276">
<id>302</id>
<edge_type>1</edge_type>
<source_obj>167</source_obj>
<sink_obj>120</sink_obj>
</item>
<item class_id_reference="20" object_id="_277">
<id>303</id>
<edge_type>2</edge_type>
<source_obj>118</source_obj>
<sink_obj>120</sink_obj>
</item>
<item class_id_reference="20" object_id="_278">
<id>304</id>
<edge_type>1</edge_type>
<source_obj>150</source_obj>
<sink_obj>121</sink_obj>
</item>
<item class_id_reference="20" object_id="_279">
<id>305</id>
<edge_type>2</edge_type>
<source_obj>152</source_obj>
<sink_obj>121</sink_obj>
</item>
<item class_id_reference="20" object_id="_280">
<id>306</id>
<edge_type>1</edge_type>
<source_obj>167</source_obj>
<sink_obj>121</sink_obj>
</item>
<item class_id_reference="20" object_id="_281">
<id>307</id>
<edge_type>2</edge_type>
<source_obj>118</source_obj>
<sink_obj>121</sink_obj>
</item>
<item class_id_reference="20" object_id="_282">
<id>308</id>
<edge_type>1</edge_type>
<source_obj>119</source_obj>
<sink_obj>122</sink_obj>
</item>
<item class_id_reference="20" object_id="_283">
<id>309</id>
<edge_type>1</edge_type>
<source_obj>210</source_obj>
<sink_obj>122</sink_obj>
</item>
<item class_id_reference="20" object_id="_284">
<id>310</id>
<edge_type>1</edge_type>
<source_obj>119</source_obj>
<sink_obj>123</sink_obj>
</item>
<item class_id_reference="20" object_id="_285">
<id>311</id>
<edge_type>1</edge_type>
<source_obj>213</source_obj>
<sink_obj>123</sink_obj>
</item>
<item class_id_reference="20" object_id="_286">
<id>312</id>
<edge_type>1</edge_type>
<source_obj>122</source_obj>
<sink_obj>124</sink_obj>
</item>
<item class_id_reference="20" object_id="_287">
<id>313</id>
<edge_type>2</edge_type>
<source_obj>152</source_obj>
<sink_obj>124</sink_obj>
</item>
<item class_id_reference="20" object_id="_288">
<id>314</id>
<edge_type>2</edge_type>
<source_obj>154</source_obj>
<sink_obj>124</sink_obj>
</item>
<item class_id_reference="20" object_id="_289">
<id>315</id>
<edge_type>1</edge_type>
<source_obj>120</source_obj>
<sink_obj>126</sink_obj>
</item>
<item class_id_reference="20" object_id="_290">
<id>316</id>
<edge_type>1</edge_type>
<source_obj>176</source_obj>
<sink_obj>126</sink_obj>
</item>
<item class_id_reference="20" object_id="_291">
<id>317</id>
<edge_type>1</edge_type>
<source_obj>121</source_obj>
<sink_obj>129</sink_obj>
</item>
<item class_id_reference="20" object_id="_292">
<id>318</id>
<edge_type>1</edge_type>
<source_obj>173</source_obj>
<sink_obj>129</sink_obj>
</item>
<item class_id_reference="20" object_id="_293">
<id>319</id>
<edge_type>1</edge_type>
<source_obj>129</source_obj>
<sink_obj>130</sink_obj>
</item>
<item class_id_reference="20" object_id="_294">
<id>320</id>
<edge_type>1</edge_type>
<source_obj>167</source_obj>
<sink_obj>130</sink_obj>
</item>
<item class_id_reference="20" object_id="_295">
<id>321</id>
<edge_type>1</edge_type>
<source_obj>121</source_obj>
<sink_obj>130</sink_obj>
</item>
<item class_id_reference="20" object_id="_296">
<id>322</id>
<edge_type>1</edge_type>
<source_obj>129</source_obj>
<sink_obj>131</sink_obj>
</item>
<item class_id_reference="20" object_id="_297">
<id>323</id>
<edge_type>1</edge_type>
<source_obj>126</source_obj>
<sink_obj>131</sink_obj>
</item>
<item class_id_reference="20" object_id="_298">
<id>324</id>
<edge_type>1</edge_type>
<source_obj>120</source_obj>
<sink_obj>131</sink_obj>
</item>
<item class_id_reference="20" object_id="_299">
<id>325</id>
<edge_type>1</edge_type>
<source_obj>131</source_obj>
<sink_obj>132</sink_obj>
</item>
<item class_id_reference="20" object_id="_300">
<id>327</id>
<edge_type>1</edge_type>
<source_obj>131</source_obj>
<sink_obj>133</sink_obj>
</item>
<item class_id_reference="20" object_id="_301">
<id>328</id>
<edge_type>1</edge_type>
<source_obj>237</source_obj>
<sink_obj>133</sink_obj>
</item>
<item class_id_reference="20" object_id="_302">
<id>329</id>
<edge_type>1</edge_type>
<source_obj>133</source_obj>
<sink_obj>134</sink_obj>
</item>
<item class_id_reference="20" object_id="_303">
<id>330</id>
<edge_type>1</edge_type>
<source_obj>130</source_obj>
<sink_obj>138</sink_obj>
</item>
<item class_id_reference="20" object_id="_304">
<id>331</id>
<edge_type>1</edge_type>
<source_obj>138</source_obj>
<sink_obj>139</sink_obj>
</item>
<item class_id_reference="20" object_id="_305">
<id>332</id>
<edge_type>1</edge_type>
<source_obj>134</source_obj>
<sink_obj>139</sink_obj>
</item>
<item class_id_reference="20" object_id="_306">
<id>333</id>
<edge_type>1</edge_type>
<source_obj>139</source_obj>
<sink_obj>140</sink_obj>
</item>
<item class_id_reference="20" object_id="_307">
<id>334</id>
<edge_type>1</edge_type>
<source_obj>9</source_obj>
<sink_obj>141</sink_obj>
</item>
<item class_id_reference="20" object_id="_308">
<id>335</id>
<edge_type>1</edge_type>
<source_obj>244</source_obj>
<sink_obj>141</sink_obj>
</item>
<item class_id_reference="20" object_id="_309">
<id>336</id>
<edge_type>1</edge_type>
<source_obj>140</source_obj>
<sink_obj>141</sink_obj>
</item>
<item class_id_reference="20" object_id="_310">
<id>338</id>
<edge_type>1</edge_type>
<source_obj>130</source_obj>
<sink_obj>142</sink_obj>
</item>
<item class_id_reference="20" object_id="_311">
<id>339</id>
<edge_type>1</edge_type>
<source_obj>237</source_obj>
<sink_obj>142</sink_obj>
</item>
<item class_id_reference="20" object_id="_312">
<id>340</id>
<edge_type>1</edge_type>
<source_obj>142</source_obj>
<sink_obj>143</sink_obj>
</item>
<item class_id_reference="20" object_id="_313">
<id>341</id>
<edge_type>1</edge_type>
<source_obj>132</source_obj>
<sink_obj>144</sink_obj>
</item>
<item class_id_reference="20" object_id="_314">
<id>342</id>
<edge_type>1</edge_type>
<source_obj>143</source_obj>
<sink_obj>144</sink_obj>
</item>
<item class_id_reference="20" object_id="_315">
<id>343</id>
<edge_type>1</edge_type>
<source_obj>144</source_obj>
<sink_obj>145</sink_obj>
</item>
<item class_id_reference="20" object_id="_316">
<id>344</id>
<edge_type>1</edge_type>
<source_obj>19</source_obj>
<sink_obj>146</sink_obj>
</item>
<item class_id_reference="20" object_id="_317">
<id>345</id>
<edge_type>1</edge_type>
<source_obj>244</source_obj>
<sink_obj>146</sink_obj>
</item>
<item class_id_reference="20" object_id="_318">
<id>346</id>
<edge_type>1</edge_type>
<source_obj>145</source_obj>
<sink_obj>146</sink_obj>
</item>
<item class_id_reference="20" object_id="_319">
<id>347</id>
<edge_type>1</edge_type>
<source_obj>146</source_obj>
<sink_obj>147</sink_obj>
</item>
<item class_id_reference="20" object_id="_320">
<id>348</id>
<edge_type>1</edge_type>
<source_obj>147</source_obj>
<sink_obj>148</sink_obj>
</item>
<item class_id_reference="20" object_id="_321">
<id>349</id>
<edge_type>1</edge_type>
<source_obj>141</source_obj>
<sink_obj>148</sink_obj>
</item>
<item class_id_reference="20" object_id="_322">
<id>350</id>
<edge_type>1</edge_type>
<source_obj>130</source_obj>
<sink_obj>150</sink_obj>
</item>
<item class_id_reference="20" object_id="_323">
<id>351</id>
<edge_type>1</edge_type>
<source_obj>176</source_obj>
<sink_obj>150</sink_obj>
</item>
<item class_id_reference="20" object_id="_324">
<id>352</id>
<edge_type>2</edge_type>
<source_obj>125</source_obj>
<sink_obj>151</sink_obj>
</item>
<item class_id_reference="20" object_id="_325">
<id>353</id>
<edge_type>1</edge_type>
<source_obj>20</source_obj>
<sink_obj>93</sink_obj>
</item>
<item class_id_reference="20" object_id="_326">
<id>354</id>
<edge_type>1</edge_type>
<source_obj>244</source_obj>
<sink_obj>93</sink_obj>
</item>
<item class_id_reference="20" object_id="_327">
<id>355</id>
<edge_type>1</edge_type>
<source_obj>55</source_obj>
<sink_obj>93</sink_obj>
</item>
<item class_id_reference="20" object_id="_328">
<id>356</id>
<edge_type>1</edge_type>
<source_obj>65</source_obj>
<sink_obj>94</sink_obj>
</item>
<item class_id_reference="20" object_id="_329">
<id>357</id>
<edge_type>1</edge_type>
<source_obj>93</source_obj>
<sink_obj>94</sink_obj>
</item>
<item class_id_reference="20" object_id="_330">
<id>358</id>
<edge_type>2</edge_type>
<source_obj>104</source_obj>
<sink_obj>95</sink_obj>
</item>
<item class_id_reference="20" object_id="_331">
<id>359</id>
<edge_type>1</edge_type>
<source_obj>21</source_obj>
<sink_obj>89</sink_obj>
</item>
<item class_id_reference="20" object_id="_332">
<id>360</id>
<edge_type>1</edge_type>
<source_obj>244</source_obj>
<sink_obj>89</sink_obj>
</item>
<item class_id_reference="20" object_id="_333">
<id>361</id>
<edge_type>1</edge_type>
<source_obj>55</source_obj>
<sink_obj>89</sink_obj>
</item>
<item class_id_reference="20" object_id="_334">
<id>362</id>
<edge_type>1</edge_type>
<source_obj>65</source_obj>
<sink_obj>90</sink_obj>
</item>
<item class_id_reference="20" object_id="_335">
<id>363</id>
<edge_type>1</edge_type>
<source_obj>89</source_obj>
<sink_obj>90</sink_obj>
</item>
<item class_id_reference="20" object_id="_336">
<id>364</id>
<edge_type>2</edge_type>
<source_obj>104</source_obj>
<sink_obj>91</sink_obj>
</item>
<item class_id_reference="20" object_id="_337">
<id>365</id>
<edge_type>1</edge_type>
<source_obj>22</source_obj>
<sink_obj>85</sink_obj>
</item>
<item class_id_reference="20" object_id="_338">
<id>366</id>
<edge_type>1</edge_type>
<source_obj>244</source_obj>
<sink_obj>85</sink_obj>
</item>
<item class_id_reference="20" object_id="_339">
<id>367</id>
<edge_type>1</edge_type>
<source_obj>55</source_obj>
<sink_obj>85</sink_obj>
</item>
<item class_id_reference="20" object_id="_340">
<id>368</id>
<edge_type>1</edge_type>
<source_obj>65</source_obj>
<sink_obj>86</sink_obj>
</item>
<item class_id_reference="20" object_id="_341">
<id>369</id>
<edge_type>1</edge_type>
<source_obj>85</source_obj>
<sink_obj>86</sink_obj>
</item>
<item class_id_reference="20" object_id="_342">
<id>370</id>
<edge_type>2</edge_type>
<source_obj>104</source_obj>
<sink_obj>87</sink_obj>
</item>
<item class_id_reference="20" object_id="_343">
<id>371</id>
<edge_type>1</edge_type>
<source_obj>23</source_obj>
<sink_obj>81</sink_obj>
</item>
<item class_id_reference="20" object_id="_344">
<id>372</id>
<edge_type>1</edge_type>
<source_obj>244</source_obj>
<sink_obj>81</sink_obj>
</item>
<item class_id_reference="20" object_id="_345">
<id>373</id>
<edge_type>1</edge_type>
<source_obj>55</source_obj>
<sink_obj>81</sink_obj>
</item>
<item class_id_reference="20" object_id="_346">
<id>374</id>
<edge_type>1</edge_type>
<source_obj>65</source_obj>
<sink_obj>82</sink_obj>
</item>
<item class_id_reference="20" object_id="_347">
<id>375</id>
<edge_type>1</edge_type>
<source_obj>81</source_obj>
<sink_obj>82</sink_obj>
</item>
<item class_id_reference="20" object_id="_348">
<id>376</id>
<edge_type>2</edge_type>
<source_obj>104</source_obj>
<sink_obj>83</sink_obj>
</item>
<item class_id_reference="20" object_id="_349">
<id>377</id>
<edge_type>1</edge_type>
<source_obj>24</source_obj>
<sink_obj>77</sink_obj>
</item>
<item class_id_reference="20" object_id="_350">
<id>378</id>
<edge_type>1</edge_type>
<source_obj>244</source_obj>
<sink_obj>77</sink_obj>
</item>
<item class_id_reference="20" object_id="_351">
<id>379</id>
<edge_type>1</edge_type>
<source_obj>55</source_obj>
<sink_obj>77</sink_obj>
</item>
<item class_id_reference="20" object_id="_352">
<id>380</id>
<edge_type>1</edge_type>
<source_obj>65</source_obj>
<sink_obj>78</sink_obj>
</item>
<item class_id_reference="20" object_id="_353">
<id>381</id>
<edge_type>1</edge_type>
<source_obj>77</source_obj>
<sink_obj>78</sink_obj>
</item>
<item class_id_reference="20" object_id="_354">
<id>382</id>
<edge_type>2</edge_type>
<source_obj>104</source_obj>
<sink_obj>79</sink_obj>
</item>
<item class_id_reference="20" object_id="_355">
<id>383</id>
<edge_type>1</edge_type>
<source_obj>25</source_obj>
<sink_obj>73</sink_obj>
</item>
<item class_id_reference="20" object_id="_356">
<id>384</id>
<edge_type>1</edge_type>
<source_obj>244</source_obj>
<sink_obj>73</sink_obj>
</item>
<item class_id_reference="20" object_id="_357">
<id>385</id>
<edge_type>1</edge_type>
<source_obj>55</source_obj>
<sink_obj>73</sink_obj>
</item>
<item class_id_reference="20" object_id="_358">
<id>386</id>
<edge_type>1</edge_type>
<source_obj>65</source_obj>
<sink_obj>74</sink_obj>
</item>
<item class_id_reference="20" object_id="_359">
<id>387</id>
<edge_type>1</edge_type>
<source_obj>73</source_obj>
<sink_obj>74</sink_obj>
</item>
<item class_id_reference="20" object_id="_360">
<id>388</id>
<edge_type>2</edge_type>
<source_obj>104</source_obj>
<sink_obj>75</sink_obj>
</item>
<item class_id_reference="20" object_id="_361">
<id>389</id>
<edge_type>1</edge_type>
<source_obj>26</source_obj>
<sink_obj>69</sink_obj>
</item>
<item class_id_reference="20" object_id="_362">
<id>390</id>
<edge_type>1</edge_type>
<source_obj>244</source_obj>
<sink_obj>69</sink_obj>
</item>
<item class_id_reference="20" object_id="_363">
<id>391</id>
<edge_type>1</edge_type>
<source_obj>55</source_obj>
<sink_obj>69</sink_obj>
</item>
<item class_id_reference="20" object_id="_364">
<id>392</id>
<edge_type>1</edge_type>
<source_obj>65</source_obj>
<sink_obj>70</sink_obj>
</item>
<item class_id_reference="20" object_id="_365">
<id>393</id>
<edge_type>1</edge_type>
<source_obj>69</source_obj>
<sink_obj>70</sink_obj>
</item>
<item class_id_reference="20" object_id="_366">
<id>394</id>
<edge_type>2</edge_type>
<source_obj>104</source_obj>
<sink_obj>71</sink_obj>
</item>
<item class_id_reference="20" object_id="_367">
<id>395</id>
<edge_type>1</edge_type>
<source_obj>27</source_obj>
<sink_obj>97</sink_obj>
</item>
<item class_id_reference="20" object_id="_368">
<id>396</id>
<edge_type>1</edge_type>
<source_obj>244</source_obj>
<sink_obj>97</sink_obj>
</item>
<item class_id_reference="20" object_id="_369">
<id>397</id>
<edge_type>1</edge_type>
<source_obj>55</source_obj>
<sink_obj>97</sink_obj>
</item>
<item class_id_reference="20" object_id="_370">
<id>398</id>
<edge_type>1</edge_type>
<source_obj>65</source_obj>
<sink_obj>98</sink_obj>
</item>
<item class_id_reference="20" object_id="_371">
<id>399</id>
<edge_type>1</edge_type>
<source_obj>97</source_obj>
<sink_obj>98</sink_obj>
</item>
<item class_id_reference="20" object_id="_372">
<id>400</id>
<edge_type>2</edge_type>
<source_obj>104</source_obj>
<sink_obj>99</sink_obj>
</item>
<item class_id_reference="20" object_id="_373">
<id>401</id>
<edge_type>1</edge_type>
<source_obj>10</source_obj>
<sink_obj>37</sink_obj>
</item>
<item class_id_reference="20" object_id="_374">
<id>402</id>
<edge_type>1</edge_type>
<source_obj>11</source_obj>
<sink_obj>37</sink_obj>
</item>
<item class_id_reference="20" object_id="_375">
<id>403</id>
<edge_type>1</edge_type>
<source_obj>12</source_obj>
<sink_obj>37</sink_obj>
</item>
<item class_id_reference="20" object_id="_376">
<id>404</id>
<edge_type>1</edge_type>
<source_obj>13</source_obj>
<sink_obj>37</sink_obj>
</item>
<item class_id_reference="20" object_id="_377">
<id>405</id>
<edge_type>1</edge_type>
<source_obj>14</source_obj>
<sink_obj>37</sink_obj>
</item>
<item class_id_reference="20" object_id="_378">
<id>406</id>
<edge_type>1</edge_type>
<source_obj>15</source_obj>
<sink_obj>37</sink_obj>
</item>
<item class_id_reference="20" object_id="_379">
<id>407</id>
<edge_type>1</edge_type>
<source_obj>16</source_obj>
<sink_obj>37</sink_obj>
</item>
<item class_id_reference="20" object_id="_380">
<id>408</id>
<edge_type>1</edge_type>
<source_obj>17</source_obj>
<sink_obj>37</sink_obj>
</item>
<item class_id_reference="20" object_id="_381">
<id>409</id>
<edge_type>1</edge_type>
<source_obj>10</source_obj>
<sink_obj>114</sink_obj>
</item>
<item class_id_reference="20" object_id="_382">
<id>410</id>
<edge_type>1</edge_type>
<source_obj>11</source_obj>
<sink_obj>114</sink_obj>
</item>
<item class_id_reference="20" object_id="_383">
<id>411</id>
<edge_type>1</edge_type>
<source_obj>12</source_obj>
<sink_obj>114</sink_obj>
</item>
<item class_id_reference="20" object_id="_384">
<id>412</id>
<edge_type>1</edge_type>
<source_obj>13</source_obj>
<sink_obj>114</sink_obj>
</item>
<item class_id_reference="20" object_id="_385">
<id>413</id>
<edge_type>1</edge_type>
<source_obj>14</source_obj>
<sink_obj>114</sink_obj>
</item>
<item class_id_reference="20" object_id="_386">
<id>414</id>
<edge_type>1</edge_type>
<source_obj>15</source_obj>
<sink_obj>114</sink_obj>
</item>
<item class_id_reference="20" object_id="_387">
<id>415</id>
<edge_type>1</edge_type>
<source_obj>16</source_obj>
<sink_obj>114</sink_obj>
</item>
<item class_id_reference="20" object_id="_388">
<id>416</id>
<edge_type>1</edge_type>
<source_obj>17</source_obj>
<sink_obj>114</sink_obj>
</item>
<item class_id_reference="20" object_id="_389">
<id>484</id>
<edge_type>2</edge_type>
<source_obj>29</source_obj>
<sink_obj>35</sink_obj>
</item>
<item class_id_reference="20" object_id="_390">
<id>485</id>
<edge_type>2</edge_type>
<source_obj>35</source_obj>
<sink_obj>41</sink_obj>
</item>
<item class_id_reference="20" object_id="_391">
<id>486</id>
<edge_type>2</edge_type>
<source_obj>35</source_obj>
<sink_obj>39</sink_obj>
</item>
<item class_id_reference="20" object_id="_392">
<id>487</id>
<edge_type>2</edge_type>
<source_obj>39</source_obj>
<sink_obj>35</sink_obj>
</item>
<item class_id_reference="20" object_id="_393">
<id>488</id>
<edge_type>2</edge_type>
<source_obj>41</source_obj>
<sink_obj>48</sink_obj>
</item>
<item class_id_reference="20" object_id="_394">
<id>489</id>
<edge_type>2</edge_type>
<source_obj>48</source_obj>
<sink_obj>106</sink_obj>
</item>
<item class_id_reference="20" object_id="_395">
<id>490</id>
<edge_type>2</edge_type>
<source_obj>48</source_obj>
<sink_obj>68</sink_obj>
</item>
<item class_id_reference="20" object_id="_396">
<id>491</id>
<edge_type>2</edge_type>
<source_obj>68</source_obj>
<sink_obj>100</sink_obj>
</item>
<item class_id_reference="20" object_id="_397">
<id>492</id>
<edge_type>2</edge_type>
<source_obj>68</source_obj>
<sink_obj>96</sink_obj>
</item>
<item class_id_reference="20" object_id="_398">
<id>493</id>
<edge_type>2</edge_type>
<source_obj>68</source_obj>
<sink_obj>92</sink_obj>
</item>
<item class_id_reference="20" object_id="_399">
<id>494</id>
<edge_type>2</edge_type>
<source_obj>68</source_obj>
<sink_obj>88</sink_obj>
</item>
<item class_id_reference="20" object_id="_400">
<id>495</id>
<edge_type>2</edge_type>
<source_obj>68</source_obj>
<sink_obj>84</sink_obj>
</item>
<item class_id_reference="20" object_id="_401">
<id>496</id>
<edge_type>2</edge_type>
<source_obj>68</source_obj>
<sink_obj>80</sink_obj>
</item>
<item class_id_reference="20" object_id="_402">
<id>497</id>
<edge_type>2</edge_type>
<source_obj>68</source_obj>
<sink_obj>76</sink_obj>
</item>
<item class_id_reference="20" object_id="_403">
<id>498</id>
<edge_type>2</edge_type>
<source_obj>68</source_obj>
<sink_obj>72</sink_obj>
</item>
<item class_id_reference="20" object_id="_404">
<id>499</id>
<edge_type>2</edge_type>
<source_obj>72</source_obj>
<sink_obj>104</sink_obj>
</item>
<item class_id_reference="20" object_id="_405">
<id>500</id>
<edge_type>2</edge_type>
<source_obj>76</source_obj>
<sink_obj>104</sink_obj>
</item>
<item class_id_reference="20" object_id="_406">
<id>501</id>
<edge_type>2</edge_type>
<source_obj>80</source_obj>
<sink_obj>104</sink_obj>
</item>
<item class_id_reference="20" object_id="_407">
<id>502</id>
<edge_type>2</edge_type>
<source_obj>84</source_obj>
<sink_obj>104</sink_obj>
</item>
<item class_id_reference="20" object_id="_408">
<id>503</id>
<edge_type>2</edge_type>
<source_obj>88</source_obj>
<sink_obj>104</sink_obj>
</item>
<item class_id_reference="20" object_id="_409">
<id>504</id>
<edge_type>2</edge_type>
<source_obj>92</source_obj>
<sink_obj>104</sink_obj>
</item>
<item class_id_reference="20" object_id="_410">
<id>505</id>
<edge_type>2</edge_type>
<source_obj>96</source_obj>
<sink_obj>104</sink_obj>
</item>
<item class_id_reference="20" object_id="_411">
<id>506</id>
<edge_type>2</edge_type>
<source_obj>100</source_obj>
<sink_obj>104</sink_obj>
</item>
<item class_id_reference="20" object_id="_412">
<id>507</id>
<edge_type>2</edge_type>
<source_obj>104</source_obj>
<sink_obj>48</sink_obj>
</item>
<item class_id_reference="20" object_id="_413">
<id>508</id>
<edge_type>2</edge_type>
<source_obj>106</source_obj>
<sink_obj>112</sink_obj>
</item>
<item class_id_reference="20" object_id="_414">
<id>509</id>
<edge_type>2</edge_type>
<source_obj>112</source_obj>
<sink_obj>118</sink_obj>
</item>
<item class_id_reference="20" object_id="_415">
<id>510</id>
<edge_type>2</edge_type>
<source_obj>112</source_obj>
<sink_obj>116</sink_obj>
</item>
<item class_id_reference="20" object_id="_416">
<id>511</id>
<edge_type>2</edge_type>
<source_obj>116</source_obj>
<sink_obj>112</sink_obj>
</item>
<item class_id_reference="20" object_id="_417">
<id>512</id>
<edge_type>2</edge_type>
<source_obj>118</source_obj>
<sink_obj>125</sink_obj>
</item>
<item class_id_reference="20" object_id="_418">
<id>513</id>
<edge_type>2</edge_type>
<source_obj>125</source_obj>
<sink_obj>154</sink_obj>
</item>
<item class_id_reference="20" object_id="_419">
<id>514</id>
<edge_type>2</edge_type>
<source_obj>125</source_obj>
<sink_obj>152</sink_obj>
</item>
<item class_id_reference="20" object_id="_420">
<id>515</id>
<edge_type>2</edge_type>
<source_obj>152</source_obj>
<sink_obj>125</sink_obj>
</item>
</edges>
</cdfg>
<cdfg_regions class_id="21" tracking_level="0" version="0">
<count>10</count>
<item_version>0</item_version>
<item class_id="22" tracking_level="1" version="0" object_id="_421">
<mId>1</mId>
<mTag>dct_2d</mTag>
<mType>0</mType>
<sub_regions>
<count>9</count>
<item_version>0</item_version>
<item>2</item>
<item>3</item>
<item>4</item>
<item>5</item>
<item>6</item>
<item>7</item>
<item>8</item>
<item>9</item>
<item>10</item>
</sub_regions>
<basic_blocks>
<count>0</count>
<item_version>0</item_version>
</basic_blocks>
<mII>-1</mII>
<mDepth>-1</mDepth>
<mMinTripCount>-1</mMinTripCount>
<mMaxTripCount>-1</mMaxTripCount>
<mMinLatency>392</mMinLatency>
<mMaxLatency>-1</mMaxLatency>
<mIsDfPipe>0</mIsDfPipe>
<mDfPipe class_id="-1"/>
</item>
<item class_id_reference="22" object_id="_422">
<mId>2</mId>
<mTag>Entry</mTag>
<mType>0</mType>
<sub_regions>
<count>0</count>
<item_version>0</item_version>
</sub_regions>
<basic_blocks>
<count>1</count>
<item_version>0</item_version>
<item>29</item>
</basic_blocks>
<mII>-1</mII>
<mDepth>-1</mDepth>
<mMinTripCount>-1</mMinTripCount>
<mMaxTripCount>-1</mMaxTripCount>
<mMinLatency>0</mMinLatency>
<mMaxLatency>-1</mMaxLatency>
<mIsDfPipe>0</mIsDfPipe>
<mDfPipe class_id="-1"/>
</item>
<item class_id_reference="22" object_id="_423">
<mId>3</mId>
<mTag>Row_DCT_Loop</mTag>
<mType>1</mType>
<sub_regions>
<count>0</count>
<item_version>0</item_version>
</sub_regions>
<basic_blocks>
<count>2</count>
<item_version>0</item_version>
<item>35</item>
<item>39</item>
</basic_blocks>
<mII>-1</mII>
<mDepth>-1</mDepth>
<mMinTripCount>8</mMinTripCount>
<mMaxTripCount>8</mMaxTripCount>
<mMinLatency>128</mMinLatency>
<mMaxLatency>-1</mMaxLatency>
<mIsDfPipe>0</mIsDfPipe>
<mDfPipe class_id="-1"/>
</item>
<item class_id_reference="22" object_id="_424">
<mId>4</mId>
<mTag>Region 1</mTag>
<mType>0</mType>
<sub_regions>
<count>0</count>
<item_version>0</item_version>
</sub_regions>
<basic_blocks>
<count>1</count>
<item_version>0</item_version>
<item>41</item>
</basic_blocks>
<mII>-1</mII>
<mDepth>-1</mDepth>
<mMinTripCount>-1</mMinTripCount>
<mMaxTripCount>-1</mMaxTripCount>
<mMinLatency>0</mMinLatency>
<mMaxLatency>-1</mMaxLatency>
<mIsDfPipe>0</mIsDfPipe>
<mDfPipe class_id="-1"/>
</item>
<item class_id_reference="22" object_id="_425">
<mId>5</mId>
<mTag>Xpose_Row_Outer_Loop_Xpose_Row_Inner_Loop</mTag>
<mType>1</mType>
<sub_regions>
<count>0</count>
<item_version>0</item_version>
</sub_regions>
<basic_blocks>
<count>11</count>
<item_version>0</item_version>
<item>48</item>
<item>68</item>
<item>72</item>
<item>76</item>
<item>80</item>
<item>84</item>
<item>88</item>
<item>92</item>
<item>96</item>
<item>100</item>
<item>104</item>
</basic_blocks>
<mII>1</mII>
<mDepth>3</mDepth>
<mMinTripCount>64</mMinTripCount>
<mMaxTripCount>64</mMaxTripCount>
<mMinLatency>65</mMinLatency>
<mMaxLatency>-1</mMaxLatency>
<mIsDfPipe>0</mIsDfPipe>
<mDfPipe class_id="-1"/>
</item>
<item class_id_reference="22" object_id="_426">
<mId>6</mId>
<mTag>Region 2</mTag>
<mType>0</mType>
<sub_regions>
<count>0</count>
<item_version>0</item_version>
</sub_regions>
<basic_blocks>
<count>1</count>
<item_version>0</item_version>
<item>106</item>
</basic_blocks>
<mII>-1</mII>
<mDepth>-1</mDepth>
<mMinTripCount>-1</mMinTripCount>
<mMaxTripCount>-1</mMaxTripCount>
<mMinLatency>0</mMinLatency>
<mMaxLatency>-1</mMaxLatency>
<mIsDfPipe>0</mIsDfPipe>
<mDfPipe class_id="-1"/>
</item>
<item class_id_reference="22" object_id="_427">
<mId>7</mId>
<mTag>Col_DCT_Loop</mTag>
<mType>1</mType>
<sub_regions>
<count>0</count>
<item_version>0</item_version>
</sub_regions>
<basic_blocks>
<count>2</count>
<item_version>0</item_version>
<item>112</item>
<item>116</item>
</basic_blocks>
<mII>-1</mII>
<mDepth>-1</mDepth>
<mMinTripCount>8</mMinTripCount>
<mMaxTripCount>8</mMaxTripCount>
<mMinLatency>128</mMinLatency>
<mMaxLatency>-1</mMaxLatency>
<mIsDfPipe>0</mIsDfPipe>
<mDfPipe class_id="-1"/>
</item>
<item class_id_reference="22" object_id="_428">
<mId>8</mId>
<mTag>Region 3</mTag>
<mType>0</mType>
<sub_regions>
<count>0</count>
<item_version>0</item_version>
</sub_regions>
<basic_blocks>
<count>1</count>
<item_version>0</item_version>
<item>118</item>
</basic_blocks>
<mII>-1</mII>
<mDepth>-1</mDepth>
<mMinTripCount>-1</mMinTripCount>
<mMaxTripCount>-1</mMaxTripCount>
<mMinLatency>0</mMinLatency>
<mMaxLatency>-1</mMaxLatency>
<mIsDfPipe>0</mIsDfPipe>
<mDfPipe class_id="-1"/>
</item>
<item class_id_reference="22" object_id="_429">
<mId>9</mId>
<mTag>Xpose_Col_Outer_Loop_Xpose_Col_Inner_Loop</mTag>
<mType>1</mType>
<sub_regions>
<count>0</count>
<item_version>0</item_version>
</sub_regions>
<basic_blocks>
<count>2</count>
<item_version>0</item_version>
<item>125</item>
<item>152</item>
</basic_blocks>
<mII>1</mII>
<mDepth>3</mDepth>
<mMinTripCount>64</mMinTripCount>
<mMaxTripCount>64</mMaxTripCount>
<mMinLatency>65</mMinLatency>
<mMaxLatency>-1</mMaxLatency>
<mIsDfPipe>0</mIsDfPipe>
<mDfPipe class_id="-1"/>
</item>
<item class_id_reference="22" object_id="_430">
<mId>10</mId>
<mTag>Return</mTag>
<mType>0</mType>
<sub_regions>
<count>0</count>
<item_version>0</item_version>
</sub_regions>
<basic_blocks>
<count>1</count>
<item_version>0</item_version>
<item>154</item>
</basic_blocks>
<mII>-1</mII>
<mDepth>-1</mDepth>
<mMinTripCount>-1</mMinTripCount>
<mMaxTripCount>-1</mMaxTripCount>
<mMinLatency>0</mMinLatency>
<mMaxLatency>-1</mMaxLatency>
<mIsDfPipe>0</mIsDfPipe>
<mDfPipe class_id="-1"/>
</item>
</cdfg_regions>
<fsm class_id="24" tracking_level="1" version="0" object_id="_431">
<states class_id="25" tracking_level="0" version="0">
<count>13</count>
<item_version>0</item_version>
<item class_id="26" tracking_level="1" version="0" object_id="_432">
<id>1</id>
<operations class_id="27" tracking_level="0" version="0">
<count>11</count>
<item_version>0</item_version>
<item class_id="28" tracking_level="1" version="0" object_id="_433">
<id>18</id>
<stage>1</stage>
<latency>1</latency>
</item>
<item class_id_reference="28" object_id="_434">
<id>19</id>
<stage>1</stage>
<latency>1</latency>
</item>
<item class_id_reference="28" object_id="_435">
<id>20</id>
<stage>1</stage>
<latency>1</latency>
</item>
<item class_id_reference="28" object_id="_436">
<id>21</id>
<stage>1</stage>
<latency>1</latency>
</item>
<item class_id_reference="28" object_id="_437">
<id>22</id>
<stage>1</stage>
<latency>1</latency>
</item>
<item class_id_reference="28" object_id="_438">
<id>23</id>
<stage>1</stage>
<latency>1</latency>
</item>
<item class_id_reference="28" object_id="_439">
<id>24</id>
<stage>1</stage>
<latency>1</latency>
</item>
<item class_id_reference="28" object_id="_440">
<id>25</id>
<stage>1</stage>
<latency>1</latency>
</item>
<item class_id_reference="28" object_id="_441">
<id>26</id>
<stage>1</stage>
<latency>1</latency>
</item>
<item class_id_reference="28" object_id="_442">
<id>27</id>
<stage>1</stage>
<latency>1</latency>
</item>
<item class_id_reference="28" object_id="_443">
<id>28</id>
<stage>1</stage>
<latency>1</latency>
</item>
</operations>
</item>
<item class_id_reference="26" object_id="_444">
<id>2</id>
<operations>
<count>7</count>
<item_version>0</item_version>
<item class_id_reference="28" object_id="_445">
<id>30</id>
<stage>1</stage>
<latency>1</latency>
</item>
<item class_id_reference="28" object_id="_446">
<id>31</id>
<stage>1</stage>
<latency>1</latency>
</item>
<item class_id_reference="28" object_id="_447">
<id>32</id>
<stage>1</stage>
<latency>1</latency>
</item>
<item class_id_reference="28" object_id="_448">
<id>33</id>
<stage>1</stage>
<latency>1</latency>
</item>
<item class_id_reference="28" object_id="_449">
<id>34</id>
<stage>1</stage>
<latency>1</latency>
</item>
<item class_id_reference="28" object_id="_450">
<id>37</id>
<stage>2</stage>
<latency>2</latency>
</item>
<item class_id_reference="28" object_id="_451">
<id>40</id>
<stage>1</stage>
<latency>1</latency>
</item>
</operations>
</item>
<item class_id_reference="26" object_id="_452">
<id>3</id>
<operations>
<count>3</count>
<item_version>0</item_version>
<item class_id_reference="28" object_id="_453">
<id>36</id>
<stage>1</stage>
<latency>1</latency>
</item>
<item class_id_reference="28" object_id="_454">
<id>37</id>
<stage>1</stage>
<latency>2</latency>
</item>
<item class_id_reference="28" object_id="_455">
<id>38</id>
<stage>1</stage>
<latency>1</latency>
</item>
</operations>
</item>
<item class_id_reference="26" object_id="_456">
<id>4</id>
<operations>
<count>19</count>
<item_version>0</item_version>
<item class_id_reference="28" object_id="_457">
<id>42</id>
<stage>1</stage>
<latency>1</latency>
</item>
<item class_id_reference="28" object_id="_458">
<id>43</id>
<stage>1</stage>
<latency>1</latency>
</item>
<item class_id_reference="28" object_id="_459">
<id>44</id>
<stage>1</stage>
<latency>1</latency>
</item>
<item class_id_reference="28" object_id="_460">
<id>45</id>
<stage>1</stage>
<latency>1</latency>
</item>
<item class_id_reference="28" object_id="_461">
<id>46</id>
<stage>1</stage>
<latency>1</latency>
</item>
<item class_id_reference="28" object_id="_462">
<id>47</id>
<stage>1</stage>
<latency>1</latency>
</item>
<item class_id_reference="28" object_id="_463">
<id>49</id>
<stage>1</stage>
<latency>1</latency>
</item>
<item class_id_reference="28" object_id="_464">
<id>52</id>
<stage>1</stage>
<latency>1</latency>
</item>
<item class_id_reference="28" object_id="_465">
<id>53</id>
<stage>1</stage>
<latency>1</latency>
</item>
<item class_id_reference="28" object_id="_466">
<id>54</id>
<stage>1</stage>
<latency>1</latency>
</item>
<item class_id_reference="28" object_id="_467">
<id>66</id>
<stage>1</stage>
<latency>1</latency>
</item>
<item class_id_reference="28" object_id="_468">
<id>71</id>
<stage>1</stage>
<latency>1</latency>
</item>
<item class_id_reference="28" object_id="_469">
<id>75</id>
<stage>1</stage>
<latency>1</latency>
</item>
<item class_id_reference="28" object_id="_470">
<id>79</id>
<stage>1</stage>
<latency>1</latency>
</item>
<item class_id_reference="28" object_id="_471">
<id>83</id>
<stage>1</stage>
<latency>1</latency>
</item>
<item class_id_reference="28" object_id="_472">
<id>87</id>
<stage>1</stage>
<latency>1</latency>
</item>
<item class_id_reference="28" object_id="_473">
<id>91</id>
<stage>1</stage>
<latency>1</latency>
</item>
<item class_id_reference="28" object_id="_474">
<id>95</id>
<stage>1</stage>
<latency>1</latency>
</item>
<item class_id_reference="28" object_id="_475">
<id>99</id>
<stage>1</stage>
<latency>1</latency>
</item>
</operations>
</item>
<item class_id_reference="26" object_id="_476">
<id>5</id>
<operations>
<count>9</count>
<item_version>0</item_version>
<item class_id_reference="28" object_id="_477">
<id>56</id>
<stage>1</stage>
<latency>1</latency>
</item>
<item class_id_reference="28" object_id="_478">
<id>60</id>
<stage>1</stage>
<latency>1</latency>
</item>
<item class_id_reference="28" object_id="_479">
<id>61</id>
<stage>1</stage>
<latency>1</latency>
</item>
<item class_id_reference="28" object_id="_480">
<id>62</id>
<stage>1</stage>
<latency>1</latency>
</item>
<item class_id_reference="28" object_id="_481">
<id>63</id>
<stage>1</stage>
<latency>1</latency>
</item>
<item class_id_reference="28" object_id="_482">
<id>64</id>
<stage>1</stage>
<latency>1</latency>
</item>
<item class_id_reference="28" object_id="_483">
<id>65</id>
<stage>2</stage>
<latency>2</latency>
</item>
<item class_id_reference="28" object_id="_484">
<id>67</id>
<stage>1</stage>
<latency>1</latency>
</item>
<item class_id_reference="28" object_id="_485">
<id>102</id>
<stage>1</stage>
<latency>1</latency>
</item>
</operations>
</item>
<item class_id_reference="26" object_id="_486">
<id>6</id>
<operations>
<count>25</count>
<item_version>0</item_version>
<item class_id_reference="28" object_id="_487">
<id>50</id>
<stage>1</stage>
<latency>1</latency>
</item>
<item class_id_reference="28" object_id="_488">
<id>51</id>
<stage>1</stage>
<latency>1</latency>
</item>
<item class_id_reference="28" object_id="_489">
<id>55</id>
<stage>1</stage>
<latency>1</latency>
</item>
<item class_id_reference="28" object_id="_490">
<id>57</id>
<stage>1</stage>
<latency>1</latency>
</item>
<item class_id_reference="28" object_id="_491">
<id>58</id>
<stage>1</stage>
<latency>1</latency>
</item>
<item class_id_reference="28" object_id="_492">
<id>59</id>
<stage>1</stage>
<latency>1</latency>
</item>
<item class_id_reference="28" object_id="_493">
<id>65</id>
<stage>1</stage>
<latency>2</latency>
</item>
<item class_id_reference="28" object_id="_494">
<id>69</id>
<stage>1</stage>
<latency>1</latency>
</item>
<item class_id_reference="28" object_id="_495">
<id>70</id>
<stage>1</stage>
<latency>1</latency>
</item>
<item class_id_reference="28" object_id="_496">
<id>73</id>
<stage>1</stage>
<latency>1</latency>
</item>
<item class_id_reference="28" object_id="_497">
<id>74</id>
<stage>1</stage>
<latency>1</latency>
</item>
<item class_id_reference="28" object_id="_498">
<id>77</id>
<stage>1</stage>
<latency>1</latency>
</item>
<item class_id_reference="28" object_id="_499">
<id>78</id>
<stage>1</stage>
<latency>1</latency>
</item>
<item class_id_reference="28" object_id="_500">
<id>81</id>
<stage>1</stage>
<latency>1</latency>
</item>
<item class_id_reference="28" object_id="_501">
<id>82</id>
<stage>1</stage>
<latency>1</latency>
</item>
<item class_id_reference="28" object_id="_502">
<id>85</id>
<stage>1</stage>
<latency>1</latency>
</item>
<item class_id_reference="28" object_id="_503">
<id>86</id>
<stage>1</stage>
<latency>1</latency>
</item>
<item class_id_reference="28" object_id="_504">
<id>89</id>
<stage>1</stage>
<latency>1</latency>
</item>
<item class_id_reference="28" object_id="_505">
<id>90</id>
<stage>1</stage>
<latency>1</latency>
</item>
<item class_id_reference="28" object_id="_506">
<id>93</id>
<stage>1</stage>
<latency>1</latency>
</item>
<item class_id_reference="28" object_id="_507">
<id>94</id>
<stage>1</stage>
<latency>1</latency>
</item>
<item class_id_reference="28" object_id="_508">
<id>97</id>
<stage>1</stage>
<latency>1</latency>
</item>
<item class_id_reference="28" object_id="_509">
<id>98</id>
<stage>1</stage>
<latency>1</latency>
</item>
<item class_id_reference="28" object_id="_510">
<id>101</id>
<stage>1</stage>
<latency>1</latency>
</item>
<item class_id_reference="28" object_id="_511">
<id>103</id>
<stage>1</stage>
<latency>1</latency>
</item>
</operations>
</item>
<item class_id_reference="26" object_id="_512">
<id>7</id>
<operations>
<count>1</count>
<item_version>0</item_version>
<item class_id_reference="28" object_id="_513">
<id>105</id>
<stage>1</stage>
<latency>1</latency>
</item>
</operations>
</item>
<item class_id_reference="26" object_id="_514">
<id>8</id>
<operations>
<count>7</count>
<item_version>0</item_version>
<item class_id_reference="28" object_id="_515">
<id>107</id>
<stage>1</stage>
<latency>1</latency>
</item>
<item class_id_reference="28" object_id="_516">
<id>108</id>
<stage>1</stage>
<latency>1</latency>
</item>
<item class_id_reference="28" object_id="_517">
<id>109</id>
<stage>1</stage>
<latency>1</latency>
</item>
<item class_id_reference="28" object_id="_518">
<id>110</id>
<stage>1</stage>
<latency>1</latency>
</item>
<item class_id_reference="28" object_id="_519">
<id>111</id>
<stage>1</stage>
<latency>1</latency>
</item>
<item class_id_reference="28" object_id="_520">
<id>114</id>
<stage>2</stage>
<latency>2</latency>
</item>
<item class_id_reference="28" object_id="_521">
<id>117</id>
<stage>1</stage>
<latency>1</latency>
</item>
</operations>
</item>
<item class_id_reference="26" object_id="_522">
<id>9</id>
<operations>
<count>3</count>
<item_version>0</item_version>
<item class_id_reference="28" object_id="_523">
<id>113</id>
<stage>1</stage>
<latency>1</latency>
</item>
<item class_id_reference="28" object_id="_524">
<id>114</id>
<stage>1</stage>
<latency>2</latency>
</item>
<item class_id_reference="28" object_id="_525">
<id>115</id>
<stage>1</stage>
<latency>1</latency>
</item>
</operations>
</item>
<item class_id_reference="26" object_id="_526">
<id>10</id>
<operations>
<count>10</count>
<item_version>0</item_version>
<item class_id_reference="28" object_id="_527">
<id>119</id>
<stage>1</stage>
<latency>1</latency>
</item>
<item class_id_reference="28" object_id="_528">
<id>120</id>
<stage>1</stage>
<latency>1</latency>
</item>
<item class_id_reference="28" object_id="_529">
<id>121</id>
<stage>1</stage>
<latency>1</latency>
</item>
<item class_id_reference="28" object_id="_530">
<id>122</id>
<stage>1</stage>
<latency>1</latency>
</item>
<item class_id_reference="28" object_id="_531">
<id>123</id>
<stage>1</stage>
<latency>1</latency>
</item>
<item class_id_reference="28" object_id="_532">
<id>124</id>
<stage>1</stage>
<latency>1</latency>
</item>
<item class_id_reference="28" object_id="_533">
<id>126</id>
<stage>1</stage>
<latency>1</latency>
</item>
<item class_id_reference="28" object_id="_534">
<id>129</id>
<stage>1</stage>
<latency>1</latency>
</item>
<item class_id_reference="28" object_id="_535">
<id>130</id>
<stage>1</stage>
<latency>1</latency>
</item>
<item class_id_reference="28" object_id="_536">
<id>131</id>
<stage>1</stage>
<latency>1</latency>
</item>
</operations>
</item>
<item class_id_reference="26" object_id="_537">
<id>11</id>
<operations>
<count>8</count>
<item_version>0</item_version>
<item class_id_reference="28" object_id="_538">
<id>132</id>
<stage>1</stage>
<latency>1</latency>
</item>
<item class_id_reference="28" object_id="_539">
<id>142</id>
<stage>1</stage>
<latency>1</latency>
</item>
<item class_id_reference="28" object_id="_540">
<id>143</id>
<stage>1</stage>
<latency>1</latency>
</item>
<item class_id_reference="28" object_id="_541">
<id>144</id>
<stage>1</stage>
<latency>1</latency>
</item>
<item class_id_reference="28" object_id="_542">
<id>145</id>
<stage>1</stage>
<latency>1</latency>
</item>
<item class_id_reference="28" object_id="_543">
<id>146</id>
<stage>1</stage>
<latency>1</latency>
</item>
<item class_id_reference="28" object_id="_544">
<id>147</id>
<stage>2</stage>
<latency>2</latency>
</item>
<item class_id_reference="28" object_id="_545">
<id>150</id>
<stage>1</stage>
<latency>1</latency>
</item>
</operations>
</item>
<item class_id_reference="26" object_id="_546">
<id>12</id>
<operations>
<count>15</count>
<item_version>0</item_version>
<item class_id_reference="28" object_id="_547">
<id>127</id>
<stage>1</stage>
<latency>1</latency>
</item>
<item class_id_reference="28" object_id="_548">
<id>128</id>
<stage>1</stage>
<latency>1</latency>
</item>
<item class_id_reference="28" object_id="_549">
<id>133</id>
<stage>1</stage>
<latency>1</latency>
</item>
<item class_id_reference="28" object_id="_550">
<id>134</id>
<stage>1</stage>
<latency>1</latency>
</item>
<item class_id_reference="28" object_id="_551">
<id>135</id>
<stage>1</stage>
<latency>1</latency>
</item>
<item class_id_reference="28" object_id="_552">
<id>136</id>
<stage>1</stage>
<latency>1</latency>
</item>
<item class_id_reference="28" object_id="_553">
<id>137</id>
<stage>1</stage>
<latency>1</latency>
</item>
<item class_id_reference="28" object_id="_554">
<id>138</id>
<stage>1</stage>
<latency>1</latency>
</item>
<item class_id_reference="28" object_id="_555">
<id>139</id>
<stage>1</stage>
<latency>1</latency>
</item>
<item class_id_reference="28" object_id="_556">
<id>140</id>
<stage>1</stage>
<latency>1</latency>
</item>
<item class_id_reference="28" object_id="_557">
<id>141</id>
<stage>1</stage>
<latency>1</latency>
</item>
<item class_id_reference="28" object_id="_558">
<id>147</id>
<stage>1</stage>
<latency>2</latency>
</item>
<item class_id_reference="28" object_id="_559">
<id>148</id>
<stage>1</stage>
<latency>1</latency>
</item>
<item class_id_reference="28" object_id="_560">
<id>149</id>
<stage>1</stage>
<latency>1</latency>
</item>
<item class_id_reference="28" object_id="_561">
<id>151</id>
<stage>1</stage>
<latency>1</latency>
</item>
</operations>
</item>
<item class_id_reference="26" object_id="_562">
<id>13</id>
<operations>
<count>1</count>
<item_version>0</item_version>
<item class_id_reference="28" object_id="_563">
<id>153</id>
<stage>1</stage>
<latency>1</latency>
</item>
</operations>
</item>
</states>
<transitions class_id="29" tracking_level="0" version="0">
<count>16</count>
<item_version>0</item_version>
<item class_id="30" tracking_level="1" version="0" object_id="_564">
<inState>1</inState>
<outState>2</outState>
<condition class_id="31" tracking_level="0" version="0">
<id>118</id>
<sop class_id="32" tracking_level="0" version="0">
<count>1</count>
<item_version>0</item_version>
<item class_id="33" tracking_level="0" version="0">
<count>0</count>
<item_version>0</item_version>
</item>
</sop>
</condition>
</item>
<item class_id_reference="30" object_id="_565">
<inState>2</inState>
<outState>3</outState>
<condition>
<id>119</id>
<sop>
<count>1</count>
<item_version>0</item_version>
<item>
<count>1</count>
<item_version>0</item_version>
<item class_id="34" tracking_level="0" version="0">
<first class_id="35" tracking_level="0" version="0">
<first>31</first>
<second>0</second>
</first>
<second>1</second>
</item>
</item>
</sop>
</condition>
</item>
<item class_id_reference="30" object_id="_566">
<inState>3</inState>
<outState>2</outState>
<condition>
<id>122</id>
<sop>
<count>1</count>
<item_version>0</item_version>
<item>
<count>0</count>
<item_version>0</item_version>
</item>
</sop>
</condition>
</item>
<item class_id_reference="30" object_id="_567">
<inState>2</inState>
<outState>4</outState>
<condition>
<id>124</id>
<sop>
<count>1</count>
<item_version>0</item_version>
<item>
<count>1</count>
<item_version>0</item_version>
<item>
<first>
<first>31</first>
<second>0</second>
</first>
<second>0</second>
</item>
</item>
</sop>
</condition>
</item>
<item class_id_reference="30" object_id="_568">
<inState>7</inState>
<outState>8</outState>
<condition>
<id>150</id>
<sop>
<count>1</count>
<item_version>0</item_version>
<item>
<count>0</count>
<item_version>0</item_version>
</item>
</sop>
</condition>
</item>
<item class_id_reference="30" object_id="_569">
<inState>8</inState>
<outState>9</outState>
<condition>
<id>151</id>
<sop>
<count>1</count>
<item_version>0</item_version>
<item>
<count>1</count>
<item_version>0</item_version>
<item>
<first>
<first>108</first>
<second>0</second>
</first>
<second>1</second>
</item>
</item>
</sop>
</condition>
</item>
<item class_id_reference="30" object_id="_570">
<inState>9</inState>
<outState>8</outState>
<condition>
<id>154</id>
<sop>
<count>1</count>
<item_version>0</item_version>
<item>
<count>0</count>
<item_version>0</item_version>
</item>
</sop>
</condition>
</item>
<item class_id_reference="30" object_id="_571">
<inState>8</inState>
<outState>10</outState>
<condition>
<id>156</id>
<sop>
<count>1</count>
<item_version>0</item_version>
<item>
<count>1</count>
<item_version>0</item_version>
<item>
<first>
<first>108</first>
<second>0</second>
</first>
<second>0</second>
</item>
</item>
</sop>
</condition>
</item>
<item class_id_reference="30" object_id="_572">
<inState>5</inState>
<outState>6</outState>
<condition>
<id>165</id>
<sop>
<count>1</count>
<item_version>0</item_version>
<item>
<count>0</count>
<item_version>0</item_version>
</item>
</sop>
</condition>
</item>
<item class_id_reference="30" object_id="_573">
<inState>6</inState>
<outState>4</outState>
<condition>
<id>166</id>
<sop>
<count>1</count>
<item_version>0</item_version>
<item>
<count>0</count>
<item_version>0</item_version>
</item>
</sop>
</condition>
</item>
<item class_id_reference="30" object_id="_574">
<inState>4</inState>
<outState>7</outState>
<condition>
<id>164</id>
<sop>
<count>1</count>
<item_version>0</item_version>
<item>
<count>1</count>
<item_version>0</item_version>
<item>
<first>
<first>45</first>
<second>0</second>
</first>
<second>0</second>
</item>
</item>
</sop>
</condition>
</item>
<item class_id_reference="30" object_id="_575">
<inState>4</inState>
<outState>5</outState>
<condition>
<id>167</id>
<sop>
<count>1</count>
<item_version>0</item_version>
<item>
<count>1</count>
<item_version>0</item_version>
<item>
<first>
<first>45</first>
<second>0</second>
</first>
<second>1</second>
</item>
</item>
</sop>
</condition>
</item>
<item class_id_reference="30" object_id="_576">
<inState>11</inState>
<outState>12</outState>
<condition>
<id>169</id>
<sop>
<count>1</count>
<item_version>0</item_version>
<item>
<count>0</count>
<item_version>0</item_version>
</item>
</sop>
</condition>
</item>
<item class_id_reference="30" object_id="_577">
<inState>12</inState>
<outState>10</outState>
<condition>
<id>170</id>
<sop>
<count>1</count>
<item_version>0</item_version>
<item>
<count>0</count>
<item_version>0</item_version>
</item>
</sop>
</condition>
</item>
<item class_id_reference="30" object_id="_578">
<inState>10</inState>
<outState>13</outState>
<condition>
<id>168</id>
<sop>
<count>1</count>
<item_version>0</item_version>
<item>
<count>1</count>
<item_version>0</item_version>
<item>
<first>
<first>122</first>
<second>0</second>
</first>
<second>0</second>
</item>
</item>
</sop>
</condition>
</item>
<item class_id_reference="30" object_id="_579">
<inState>10</inState>
<outState>11</outState>
<condition>
<id>171</id>
<sop>
<count>1</count>
<item_version>0</item_version>
<item>
<count>1</count>
<item_version>0</item_version>
<item>
<first>
<first>122</first>
<second>0</second>
</first>
<second>1</second>
</item>
</item>
</sop>
</condition>
</item>
</transitions>
</fsm>
<res class_id="36" tracking_level="1" version="0" object_id="_580">
<dp_component_resource class_id="37" tracking_level="0" version="0">
<count>1</count>
<item_version>0</item_version>
<item class_id="38" tracking_level="0" version="0">
<first>grp_dct_1d_fu_363 (dct_1d)</first>
<second class_id="39" tracking_level="0" version="0">
<count>4</count>
<item_version>0</item_version>
<item class_id="40" tracking_level="0" version="0">
<first>BRAM</first>
<second>0</second>
</item>
<item>
<first>DSP48E</first>
<second>8</second>
</item>
<item>
<first>FF</first>
<second>738</second>
</item>
<item>
<first>LUT</first>
<second>256</second>
</item>
</second>
</item>
</dp_component_resource>
<dp_expression_resource>
<count>26</count>
<item_version>0</item_version>
<item>
<first>ap_block_state1 ( or ) </first>
<second>
<count>4</count>
<item_version>0</item_version>
<item>
<first>(0P0)</first>
<second>1</second>
</item>
<item>
<first>(1P1)</first>
<second>1</second>
</item>
<item>
<first>FF</first>
<second>0</second>
</item>
<item>
<first>LUT</first>
<second>2</second>
</item>
</second>
</item>
<item>
<first>ap_enable_pp0 ( xor ) </first>
<second>
<count>4</count>
<item_version>0</item_version>
<item>
<first>(0P0)</first>
<second>1</second>
</item>
<item>
<first>(1P1)</first>
<second>2</second>
</item>
<item>
<first>FF</first>
<second>0</second>
</item>
<item>
<first>LUT</first>
<second>2</second>
</item>
</second>
</item>
<item>
<first>ap_enable_pp1 ( xor ) </first>
<second>
<count>4</count>
<item_version>0</item_version>
<item>
<first>(0P0)</first>
<second>1</second>
</item>
<item>
<first>(1P1)</first>
<second>2</second>
</item>
<item>
<first>FF</first>
<second>0</second>
</item>
<item>
<first>LUT</first>
<second>2</second>
</item>
</second>
</item>
<item>
<first>ap_enable_reg_pp0_iter1 ( xor ) </first>
<second>
<count>4</count>
<item_version>0</item_version>
<item>
<first>(0P0)</first>
<second>1</second>
</item>
<item>
<first>(1P1)</first>
<second>2</second>
</item>
<item>
<first>FF</first>
<second>0</second>
</item>
<item>
<first>LUT</first>
<second>2</second>
</item>
</second>
</item>
<item>
<first>ap_enable_reg_pp1_iter1 ( xor ) </first>
<second>
<count>4</count>
<item_version>0</item_version>
<item>
<first>(0P0)</first>
<second>1</second>
</item>
<item>
<first>(1P1)</first>
<second>2</second>
</item>
<item>
<first>FF</first>
<second>0</second>
</item>
<item>
<first>LUT</first>
<second>2</second>
</item>
</second>
</item>
<item>
<first>exitcond_flatten1_fu_515_p2 ( icmp ) </first>
<second>
<count>4</count>
<item_version>0</item_version>
<item>
<first>(0P0)</first>
<second>7</second>
</item>
<item>
<first>(1P1)</first>
<second>8</second>
</item>
<item>
<first>FF</first>
<second>0</second>
</item>
<item>
<first>LUT</first>
<second>4</second>
</item>
</second>
</item>
<item>
<first>exitcond_flatten_fu_418_p2 ( icmp ) </first>
<second>
<count>4</count>
<item_version>0</item_version>
<item>
<first>(0P0)</first>
<second>7</second>
</item>
<item>
<first>(1P1)</first>
<second>8</second>
</item>
<item>
<first>FF</first>
<second>0</second>
</item>
<item>
<first>LUT</first>
<second>4</second>
</item>
</second>
</item>
<item>
<first>i_1_mid2_fu_442_p3 ( select ) </first>
<second>
<count>5</count>
<item_version>0</item_version>
<item>
<first>(0P0)</first>
<second>1</second>
</item>
<item>
<first>(1P1)</first>
<second>1</second>
</item>
<item>
<first>(2P2)</first>
<second>4</second>
</item>
<item>
<first>FF</first>
<second>0</second>
</item>
<item>
<first>LUT</first>
<second>4</second>
</item>
</second>
</item>
<item>
<first>i_3_mid2_fu_539_p3 ( select ) </first>
<second>
<count>5</count>
<item_version>0</item_version>
<item>
<first>(0P0)</first>
<second>1</second>
</item>
<item>
<first>(1P1)</first>
<second>1</second>
</item>
<item>
<first>(2P2)</first>
<second>4</second>
</item>
<item>
<first>FF</first>
<second>0</second>
</item>
<item>
<first>LUT</first>
<second>4</second>
</item>
</second>
</item>
<item>
<first>i_4_fu_412_p2 ( + ) </first>
<second>
<count>4</count>
<item_version>0</item_version>
<item>
<first>(0P0)</first>
<second>4</second>
</item>
<item>
<first>(1P1)</first>
<second>1</second>
</item>
<item>
<first>FF</first>
<second>0</second>
</item>
<item>
<first>LUT</first>
<second>13</second>
</item>
</second>
</item>
<item>
<first>i_5_fu_509_p2 ( + ) </first>
<second>
<count>4</count>
<item_version>0</item_version>
<item>
<first>(0P0)</first>
<second>4</second>
</item>
<item>
<first>(1P1)</first>
<second>1</second>
</item>
<item>
<first>FF</first>
<second>0</second>
</item>
<item>
<first>LUT</first>
<second>13</second>
</item>
</second>
</item>
<item>
<first>i_6_fu_487_p2 ( + ) </first>
<second>
<count>4</count>
<item_version>0</item_version>
<item>
<first>(0P0)</first>
<second>4</second>
</item>
<item>
<first>(1P1)</first>
<second>1</second>
</item>
<item>
<first>FF</first>
<second>0</second>
</item>
<item>
<first>LUT</first>
<second>13</second>
</item>
</second>
</item>
<item>
<first>i_7_fu_580_p2 ( + ) </first>
<second>
<count>4</count>
<item_version>0</item_version>
<item>
<first>(0P0)</first>
<second>4</second>
</item>
<item>
<first>(1P1)</first>
<second>1</second>
</item>
<item>
<first>FF</first>
<second>0</second>
</item>
<item>
<first>LUT</first>
<second>13</second>
</item>
</second>
</item>
<item>
<first>indvar_flatten_next1_fu_521_p2 ( + ) </first>
<second>
<count>4</count>
<item_version>0</item_version>
<item>
<first>(0P0)</first>
<second>7</second>
</item>
<item>
<first>(1P1)</first>
<second>1</second>
</item>
<item>
<first>FF</first>
<second>0</second>
</item>
<item>
<first>LUT</first>
<second>15</second>
</item>
</second>
</item>
<item>
<first>indvar_flatten_next_fu_424_p2 ( + ) </first>
<second>
<count>4</count>
<item_version>0</item_version>
<item>
<first>(0P0)</first>
<second>7</second>
</item>
<item>
<first>(1P1)</first>
<second>1</second>
</item>
<item>
<first>FF</first>
<second>0</second>
</item>
<item>
<first>LUT</first>
<second>15</second>
</item>
</second>
</item>
<item>
<first>j_2_fu_430_p2 ( + ) </first>
<second>
<count>4</count>
<item_version>0</item_version>
<item>
<first>(0P0)</first>
<second>1</second>
</item>
<item>
<first>(1P1)</first>
<second>4</second>
</item>
<item>
<first>FF</first>
<second>0</second>
</item>
<item>
<first>LUT</first>
<second>13</second>
</item>
</second>
</item>
<item>
<first>j_3_fu_527_p2 ( + ) </first>
<second>
<count>4</count>
<item_version>0</item_version>
<item>
<first>(0P0)</first>
<second>4</second>
</item>
<item>
<first>(1P1)</first>
<second>1</second>
</item>
<item>
<first>FF</first>
<second>0</second>
</item>
<item>
<first>LUT</first>
<second>13</second>
</item>
</second>
</item>
<item>
<first>tmp_11_fu_569_p2 ( + ) </first>
<second>
<count>4</count>
<item_version>0</item_version>
<item>
<first>(0P0)</first>
<second>8</second>
</item>
<item>
<first>(1P1)</first>
<second>8</second>
</item>
<item>
<first>FF</first>
<second>0</second>
</item>
<item>
<first>LUT</first>
<second>15</second>
</item>
</second>
</item>
<item>
<first>tmp_1_fu_436_p2 ( icmp ) </first>
<second>
<count>4</count>
<item_version>0</item_version>
<item>
<first>(0P0)</first>
<second>4</second>
</item>
<item>
<first>(1P1)</first>
<second>5</second>
</item>
<item>
<first>FF</first>
<second>0</second>
</item>
<item>
<first>LUT</first>
<second>2</second>
</item>
</second>
</item>
<item>
<first>tmp_2_fu_476_p2 ( + ) </first>
<second>
<count>4</count>
<item_version>0</item_version>
<item>
<first>(0P0)</first>
<second>8</second>
</item>
<item>
<first>(1P1)</first>
<second>8</second>
</item>
<item>
<first>FF</first>
<second>0</second>
</item>
<item>
<first>LUT</first>
<second>15</second>
</item>
</second>
</item>
<item>
<first>tmp_3_mid2_v_fu_450_p3 ( select ) </first>
<second>
<count>5</count>
<item_version>0</item_version>
<item>
<first>(0P0)</first>
<second>1</second>
</item>
<item>
<first>(1P1)</first>
<second>4</second>
</item>
<item>
<first>(2P2)</first>
<second>4</second>
</item>
<item>
<first>FF</first>
<second>0</second>
</item>
<item>
<first>LUT</first>
<second>4</second>
</item>
</second>
</item>
<item>
<first>tmp_4_fu_503_p2 ( icmp ) </first>
<second>
<count>4</count>
<item_version>0</item_version>
<item>
<first>(0P0)</first>
<second>4</second>
</item>
<item>
<first>(1P1)</first>
<second>5</second>
</item>
<item>
<first>FF</first>
<second>0</second>
</item>
<item>
<first>LUT</first>
<second>2</second>
</item>
</second>
</item>
<item>
<first>tmp_5_fu_533_p2 ( icmp ) </first>
<second>
<count>4</count>
<item_version>0</item_version>
<item>
<first>(0P0)</first>
<second>4</second>
</item>
<item>
<first>(1P1)</first>
<second>5</second>
</item>
<item>
<first>FF</first>
<second>0</second>
</item>
<item>
<first>LUT</first>
<second>2</second>
</item>
</second>
</item>
<item>
<first>tmp_9_fu_599_p2 ( + ) </first>
<second>
<count>4</count>
<item_version>0</item_version>
<item>
<first>(0P0)</first>
<second>8</second>
</item>
<item>
<first>(1P1)</first>
<second>8</second>
</item>
<item>
<first>FF</first>
<second>0</second>
</item>
<item>
<first>LUT</first>
<second>15</second>
</item>
</second>
</item>
<item>
<first>tmp_9_mid2_v_fu_547_p3 ( select ) </first>
<second>
<count>5</count>
<item_version>0</item_version>
<item>
<first>(0P0)</first>
<second>1</second>
</item>
<item>
<first>(1P1)</first>
<second>4</second>
</item>
<item>
<first>(2P2)</first>
<second>4</second>
</item>
<item>
<first>FF</first>
<second>0</second>
</item>
<item>
<first>LUT</first>
<second>4</second>
</item>
</second>
</item>
<item>
<first>tmp_fu_406_p2 ( icmp ) </first>
<second>
<count>4</count>
<item_version>0</item_version>
<item>
<first>(0P0)</first>
<second>4</second>
</item>
<item>
<first>(1P1)</first>
<second>5</second>
</item>
<item>
<first>FF</first>
<second>0</second>
</item>
<item>
<first>LUT</first>
<second>2</second>
</item>
</second>
</item>
</dp_expression_resource>
<dp_fifo_resource>
<count>0</count>
<item_version>0</item_version>
</dp_fifo_resource>
<dp_memory_resource>
<count>10</count>
<item_version>0</item_version>
<item>
<first>col_inbuf_0_U</first>
<second>
<count>7</count>
<item_version>0</item_version>
<item>
<first>(0Words)</first>
<second>8</second>
</item>
<item>
<first>(1Bits)</first>
<second>16</second>
</item>
<item>
<first>(2Banks)</first>
<second>1</second>
</item>
<item>
<first>(3W*Bits*Banks)</first>
<second>128</second>
</item>
<item>
<first>BRAM</first>
<second>0</second>
</item>
<item>
<first>FF</first>
<second>32</second>
</item>
<item>
<first>LUT</first>
<second>2</second>
</item>
</second>
</item>
<item>
<first>col_inbuf_1_U</first>
<second>
<count>7</count>
<item_version>0</item_version>
<item>
<first>(0Words)</first>
<second>8</second>
</item>
<item>
<first>(1Bits)</first>
<second>16</second>
</item>
<item>
<first>(2Banks)</first>
<second>1</second>
</item>
<item>
<first>(3W*Bits*Banks)</first>
<second>128</second>
</item>
<item>
<first>BRAM</first>
<second>0</second>
</item>
<item>
<first>FF</first>
<second>32</second>
</item>
<item>
<first>LUT</first>
<second>2</second>
</item>
</second>
</item>
<item>
<first>col_inbuf_2_U</first>
<second>
<count>7</count>
<item_version>0</item_version>
<item>
<first>(0Words)</first>
<second>8</second>
</item>
<item>
<first>(1Bits)</first>
<second>16</second>
</item>
<item>
<first>(2Banks)</first>
<second>1</second>
</item>
<item>
<first>(3W*Bits*Banks)</first>
<second>128</second>
</item>
<item>
<first>BRAM</first>
<second>0</second>
</item>
<item>
<first>FF</first>
<second>32</second>
</item>
<item>
<first>LUT</first>
<second>2</second>
</item>
</second>
</item>
<item>
<first>col_inbuf_3_U</first>
<second>
<count>7</count>
<item_version>0</item_version>
<item>
<first>(0Words)</first>
<second>8</second>
</item>
<item>
<first>(1Bits)</first>
<second>16</second>
</item>
<item>
<first>(2Banks)</first>
<second>1</second>
</item>
<item>
<first>(3W*Bits*Banks)</first>
<second>128</second>
</item>
<item>
<first>BRAM</first>
<second>0</second>
</item>
<item>
<first>FF</first>
<second>32</second>
</item>
<item>
<first>LUT</first>
<second>2</second>
</item>
</second>
</item>
<item>
<first>col_inbuf_4_U</first>
<second>
<count>7</count>
<item_version>0</item_version>
<item>
<first>(0Words)</first>
<second>8</second>
</item>
<item>
<first>(1Bits)</first>
<second>16</second>
</item>
<item>
<first>(2Banks)</first>
<second>1</second>
</item>
<item>
<first>(3W*Bits*Banks)</first>
<second>128</second>
</item>
<item>
<first>BRAM</first>
<second>0</second>
</item>
<item>
<first>FF</first>
<second>32</second>
</item>
<item>
<first>LUT</first>
<second>2</second>
</item>
</second>
</item>
<item>
<first>col_inbuf_5_U</first>
<second>
<count>7</count>
<item_version>0</item_version>
<item>
<first>(0Words)</first>
<second>8</second>
</item>
<item>
<first>(1Bits)</first>
<second>16</second>
</item>
<item>
<first>(2Banks)</first>
<second>1</second>
</item>
<item>
<first>(3W*Bits*Banks)</first>
<second>128</second>
</item>
<item>
<first>BRAM</first>
<second>0</second>
</item>
<item>
<first>FF</first>
<second>32</second>
</item>
<item>
<first>LUT</first>
<second>2</second>
</item>
</second>
</item>
<item>
<first>col_inbuf_6_U</first>
<second>
<count>7</count>
<item_version>0</item_version>
<item>
<first>(0Words)</first>
<second>8</second>
</item>
<item>
<first>(1Bits)</first>
<second>16</second>
</item>
<item>
<first>(2Banks)</first>
<second>1</second>
</item>
<item>
<first>(3W*Bits*Banks)</first>
<second>128</second>
</item>
<item>
<first>BRAM</first>
<second>0</second>
</item>
<item>
<first>FF</first>
<second>32</second>
</item>
<item>
<first>LUT</first>
<second>2</second>
</item>
</second>
</item>
<item>
<first>col_inbuf_7_U</first>
<second>
<count>7</count>
<item_version>0</item_version>
<item>
<first>(0Words)</first>
<second>8</second>
</item>
<item>
<first>(1Bits)</first>
<second>16</second>
</item>
<item>
<first>(2Banks)</first>
<second>1</second>
</item>
<item>
<first>(3W*Bits*Banks)</first>
<second>128</second>
</item>
<item>
<first>BRAM</first>
<second>0</second>
</item>
<item>
<first>FF</first>
<second>32</second>
</item>
<item>
<first>LUT</first>
<second>2</second>
</item>
</second>
</item>
<item>
<first>col_outbuf_U</first>
<second>
<count>7</count>
<item_version>0</item_version>
<item>
<first>(0Words)</first>
<second>64</second>
</item>
<item>
<first>(1Bits)</first>
<second>16</second>
</item>
<item>
<first>(2Banks)</first>
<second>1</second>
</item>
<item>
<first>(3W*Bits*Banks)</first>
<second>1024</second>
</item>
<item>
<first>BRAM</first>
<second>1</second>
</item>
<item>
<first>FF</first>
<second>0</second>
</item>
<item>
<first>LUT</first>
<second>0</second>
</item>
</second>
</item>
<item>
<first>row_outbuf_U</first>
<second>
<count>7</count>
<item_version>0</item_version>
<item>
<first>(0Words)</first>
<second>64</second>
</item>
<item>
<first>(1Bits)</first>
<second>16</second>
</item>
<item>
<first>(2Banks)</first>
<second>1</second>
</item>
<item>
<first>(3W*Bits*Banks)</first>
<second>1024</second>
</item>
<item>
<first>BRAM</first>
<second>1</second>
</item>
<item>
<first>FF</first>
<second>0</second>
</item>
<item>
<first>LUT</first>
<second>0</second>
</item>
</second>
</item>
</dp_memory_resource>
<dp_multiplexer_resource>
<count>58</count>
<item_version>0</item_version>
<item>
<first>ap_NS_fsm</first>
<second>
<count>4</count>
<item_version>0</item_version>
<item>
<first>(0Size)</first>
<second>10</second>
</item>
<item>
<first>(1Bits)</first>
<second>1</second>
</item>
<item>
<first>(2Count)</first>
<second>10</second>
</item>
<item>
<first>LUT</first>
<second>47</second>
</item>
</second>
</item>
<item>
<first>ap_done</first>
<second>
<count>4</count>
<item_version>0</item_version>
<item>
<first>(0Size)</first>
<second>2</second>
</item>
<item>
<first>(1Bits)</first>
<second>1</second>
</item>
<item>
<first>(2Count)</first>
<second>2</second>
</item>
<item>
<first>LUT</first>
<second>9</second>
</item>
</second>
</item>
<item>
<first>ap_enable_reg_pp0_iter1</first>
<second>
<count>4</count>
<item_version>0</item_version>
<item>
<first>(0Size)</first>
<second>2</second>
</item>
<item>
<first>(1Bits)</first>
<second>1</second>
</item>
<item>
<first>(2Count)</first>
<second>2</second>
</item>
<item>
<first>LUT</first>
<second>9</second>
</item>
</second>
</item>
<item>
<first>ap_enable_reg_pp0_iter2</first>
<second>
<count>4</count>
<item_version>0</item_version>
<item>
<first>(0Size)</first>
<second>2</second>
</item>
<item>
<first>(1Bits)</first>
<second>1</second>
</item>
<item>
<first>(2Count)</first>
<second>2</second>
</item>
<item>
<first>LUT</first>
<second>9</second>
</item>
</second>
</item>
<item>
<first>ap_enable_reg_pp1_iter1</first>
<second>
<count>4</count>
<item_version>0</item_version>
<item>
<first>(0Size)</first>
<second>2</second>
</item>
<item>
<first>(1Bits)</first>
<second>1</second>
</item>
<item>
<first>(2Count)</first>
<second>2</second>
</item>
<item>
<first>LUT</first>
<second>9</second>
</item>
</second>
</item>
<item>
<first>ap_enable_reg_pp1_iter2</first>
<second>
<count>4</count>
<item_version>0</item_version>
<item>
<first>(0Size)</first>
<second>2</second>
</item>
<item>
<first>(1Bits)</first>
<second>1</second>
</item>
<item>
<first>(2Count)</first>
<second>2</second>
</item>
<item>
<first>LUT</first>
<second>9</second>
</item>
</second>
</item>
<item>
<first>col_inbuf_0_address0</first>
<second>
<count>4</count>
<item_version>0</item_version>
<item>
<first>(0Size)</first>
<second>3</second>
</item>
<item>
<first>(1Bits)</first>
<second>3</second>
</item>
<item>
<first>(2Count)</first>
<second>9</second>
</item>
<item>
<first>LUT</first>
<second>15</second>
</item>
</second>
</item>
<item>
<first>col_inbuf_0_ce0</first>
<second>
<count>4</count>
<item_version>0</item_version>
<item>
<first>(0Size)</first>
<second>3</second>
</item>
<item>
<first>(1Bits)</first>
<second>1</second>
</item>
<item>
<first>(2Count)</first>
<second>3</second>
</item>
<item>
<first>LUT</first>
<second>15</second>
</item>
</second>
</item>
<item>
<first>col_inbuf_1_address0</first>
<second>
<count>4</count>
<item_version>0</item_version>
<item>
<first>(0Size)</first>
<second>3</second>
</item>
<item>
<first>(1Bits)</first>
<second>3</second>
</item>
<item>
<first>(2Count)</first>
<second>9</second>
</item>
<item>
<first>LUT</first>
<second>15</second>
</item>
</second>
</item>
<item>
<first>col_inbuf_1_ce0</first>
<second>
<count>4</count>
<item_version>0</item_version>
<item>
<first>(0Size)</first>
<second>3</second>
</item>
<item>
<first>(1Bits)</first>
<second>1</second>
</item>
<item>
<first>(2Count)</first>
<second>3</second>
</item>
<item>
<first>LUT</first>
<second>15</second>
</item>
</second>
</item>
<item>
<first>col_inbuf_2_address0</first>
<second>
<count>4</count>
<item_version>0</item_version>
<item>
<first>(0Size)</first>
<second>3</second>
</item>
<item>
<first>(1Bits)</first>
<second>3</second>
</item>
<item>
<first>(2Count)</first>
<second>9</second>
</item>
<item>
<first>LUT</first>
<second>15</second>
</item>
</second>
</item>
<item>
<first>col_inbuf_2_ce0</first>
<second>
<count>4</count>
<item_version>0</item_version>
<item>
<first>(0Size)</first>
<second>3</second>
</item>
<item>
<first>(1Bits)</first>
<second>1</second>
</item>
<item>
<first>(2Count)</first>
<second>3</second>
</item>
<item>
<first>LUT</first>
<second>15</second>
</item>
</second>
</item>
<item>
<first>col_inbuf_3_address0</first>
<second>
<count>4</count>
<item_version>0</item_version>
<item>
<first>(0Size)</first>
<second>3</second>
</item>
<item>
<first>(1Bits)</first>
<second>3</second>
</item>
<item>
<first>(2Count)</first>
<second>9</second>
</item>
<item>
<first>LUT</first>
<second>15</second>
</item>
</second>
</item>
<item>
<first>col_inbuf_3_ce0</first>
<second>
<count>4</count>
<item_version>0</item_version>
<item>
<first>(0Size)</first>
<second>3</second>
</item>
<item>
<first>(1Bits)</first>
<second>1</second>
</item>
<item>
<first>(2Count)</first>
<second>3</second>
</item>
<item>
<first>LUT</first>
<second>15</second>
</item>
</second>
</item>
<item>
<first>col_inbuf_4_address0</first>
<second>
<count>4</count>
<item_version>0</item_version>
<item>
<first>(0Size)</first>
<second>3</second>
</item>
<item>
<first>(1Bits)</first>
<second>3</second>
</item>
<item>
<first>(2Count)</first>
<second>9</second>
</item>
<item>
<first>LUT</first>
<second>15</second>
</item>
</second>
</item>
<item>
<first>col_inbuf_4_ce0</first>
<second>
<count>4</count>
<item_version>0</item_version>
<item>
<first>(0Size)</first>
<second>3</second>
</item>
<item>
<first>(1Bits)</first>
<second>1</second>
</item>
<item>
<first>(2Count)</first>
<second>3</second>
</item>
<item>
<first>LUT</first>
<second>15</second>
</item>
</second>
</item>
<item>
<first>col_inbuf_5_address0</first>
<second>
<count>4</count>
<item_version>0</item_version>
<item>
<first>(0Size)</first>
<second>3</second>
</item>
<item>
<first>(1Bits)</first>
<second>3</second>
</item>
<item>
<first>(2Count)</first>
<second>9</second>
</item>
<item>
<first>LUT</first>
<second>15</second>
</item>
</second>
</item>
<item>
<first>col_inbuf_5_ce0</first>
<second>
<count>4</count>
<item_version>0</item_version>
<item>
<first>(0Size)</first>
<second>3</second>
</item>
<item>
<first>(1Bits)</first>
<second>1</second>
</item>
<item>
<first>(2Count)</first>
<second>3</second>
</item>
<item>
<first>LUT</first>
<second>15</second>
</item>
</second>
</item>
<item>
<first>col_inbuf_6_address0</first>
<second>
<count>4</count>
<item_version>0</item_version>
<item>
<first>(0Size)</first>
<second>3</second>
</item>
<item>
<first>(1Bits)</first>
<second>3</second>
</item>
<item>
<first>(2Count)</first>
<second>9</second>
</item>
<item>
<first>LUT</first>
<second>15</second>
</item>
</second>
</item>
<item>
<first>col_inbuf_6_ce0</first>
<second>
<count>4</count>
<item_version>0</item_version>
<item>
<first>(0Size)</first>
<second>3</second>
</item>
<item>
<first>(1Bits)</first>
<second>1</second>
</item>
<item>
<first>(2Count)</first>
<second>3</second>
</item>
<item>
<first>LUT</first>
<second>15</second>
</item>
</second>
</item>
<item>
<first>col_inbuf_7_address0</first>
<second>
<count>4</count>
<item_version>0</item_version>
<item>
<first>(0Size)</first>
<second>3</second>
</item>
<item>
<first>(1Bits)</first>
<second>3</second>
</item>
<item>
<first>(2Count)</first>
<second>9</second>
</item>
<item>
<first>LUT</first>
<second>15</second>
</item>
</second>
</item>
<item>
<first>col_inbuf_7_ce0</first>
<second>
<count>4</count>
<item_version>0</item_version>
<item>
<first>(0Size)</first>
<second>3</second>
</item>
<item>
<first>(1Bits)</first>
<second>1</second>
</item>
<item>
<first>(2Count)</first>
<second>3</second>
</item>
<item>
<first>LUT</first>
<second>15</second>
</item>
</second>
</item>
<item>
<first>col_outbuf_address0</first>
<second>
<count>4</count>
<item_version>0</item_version>
<item>
<first>(0Size)</first>
<second>3</second>
</item>
<item>
<first>(1Bits)</first>
<second>6</second>
</item>
<item>
<first>(2Count)</first>
<second>18</second>
</item>
<item>
<first>LUT</first>
<second>15</second>
</item>
</second>
</item>
<item>
<first>col_outbuf_ce0</first>
<second>
<count>4</count>
<item_version>0</item_version>
<item>
<first>(0Size)</first>
<second>3</second>
</item>
<item>
<first>(1Bits)</first>
<second>1</second>
</item>
<item>
<first>(2Count)</first>
<second>3</second>
</item>
<item>
<first>LUT</first>
<second>15</second>
</item>
</second>
</item>
<item>
<first>col_outbuf_we0</first>
<second>
<count>4</count>
<item_version>0</item_version>
<item>
<first>(0Size)</first>
<second>2</second>
</item>
<item>
<first>(1Bits)</first>
<second>1</second>
</item>
<item>
<first>(2Count)</first>
<second>2</second>
</item>
<item>
<first>LUT</first>
<second>9</second>
</item>
</second>
</item>
<item>
<first>grp_dct_1d_fu_363_src1_q0</first>
<second>
<count>4</count>
<item_version>0</item_version>
<item>
<first>(0Size)</first>
<second>3</second>
</item>
<item>
<first>(1Bits)</first>
<second>16</second>
</item>
<item>
<first>(2Count)</first>
<second>48</second>
</item>
<item>
<first>LUT</first>
<second>15</second>
</item>
</second>
</item>
<item>
<first>grp_dct_1d_fu_363_src2_q0</first>
<second>
<count>4</count>
<item_version>0</item_version>
<item>
<first>(0Size)</first>
<second>3</second>
</item>
<item>
<first>(1Bits)</first>
<second>16</second>
</item>
<item>
<first>(2Count)</first>
<second>48</second>
</item>
<item>
<first>LUT</first>
<second>15</second>
</item>
</second>
</item>
<item>
<first>grp_dct_1d_fu_363_src3_q0</first>
<second>
<count>4</count>
<item_version>0</item_version>
<item>
<first>(0Size)</first>
<second>3</second>
</item>
<item>
<first>(1Bits)</first>
<second>16</second>
</item>
<item>
<first>(2Count)</first>
<second>48</second>
</item>
<item>
<first>LUT</first>
<second>15</second>
</item>
</second>
</item>
<item>
<first>grp_dct_1d_fu_363_src4_q0</first>
<second>
<count>4</count>
<item_version>0</item_version>
<item>
<first>(0Size)</first>
<second>3</second>
</item>
<item>
<first>(1Bits)</first>
<second>16</second>
</item>
<item>
<first>(2Count)</first>
<second>48</second>
</item>
<item>
<first>LUT</first>
<second>15</second>
</item>
</second>
</item>
<item>
<first>grp_dct_1d_fu_363_src5_q0</first>
<second>
<count>4</count>
<item_version>0</item_version>
<item>
<first>(0Size)</first>
<second>3</second>
</item>
<item>
<first>(1Bits)</first>
<second>16</second>
</item>
<item>
<first>(2Count)</first>
<second>48</second>
</item>
<item>
<first>LUT</first>
<second>15</second>
</item>
</second>
</item>
<item>
<first>grp_dct_1d_fu_363_src6_q0</first>
<second>
<count>4</count>
<item_version>0</item_version>
<item>
<first>(0Size)</first>
<second>3</second>
</item>
<item>
<first>(1Bits)</first>
<second>16</second>
</item>
<item>
<first>(2Count)</first>
<second>48</second>
</item>
<item>
<first>LUT</first>
<second>15</second>
</item>
</second>
</item>
<item>
<first>grp_dct_1d_fu_363_src7_q0</first>
<second>
<count>4</count>
<item_version>0</item_version>
<item>
<first>(0Size)</first>
<second>3</second>
</item>
<item>
<first>(1Bits)</first>
<second>16</second>
</item>
<item>
<first>(2Count)</first>
<second>48</second>
</item>
<item>
<first>LUT</first>
<second>15</second>
</item>
</second>
</item>
<item>
<first>grp_dct_1d_fu_363_src_q0</first>
<second>
<count>4</count>
<item_version>0</item_version>
<item>
<first>(0Size)</first>
<second>3</second>
</item>
<item>
<first>(1Bits)</first>
<second>16</second>
</item>
<item>
<first>(2Count)</first>
<second>48</second>
</item>
<item>
<first>LUT</first>
<second>15</second>
</item>
</second>
</item>
<item>
<first>grp_dct_1d_fu_363_tmp_6</first>
<second>
<count>4</count>
<item_version>0</item_version>
<item>
<first>(0Size)</first>
<second>3</second>
</item>
<item>
<first>(1Bits)</first>
<second>4</second>
</item>
<item>
<first>(2Count)</first>
<second>12</second>
</item>
<item>
<first>LUT</first>
<second>15</second>
</item>
</second>
</item>
<item>
<first>grp_dct_1d_fu_363_tmp_61</first>
<second>
<count>4</count>
<item_version>0</item_version>
<item>
<first>(0Size)</first>
<second>3</second>
</item>
<item>
<first>(1Bits)</first>
<second>4</second>
</item>
<item>
<first>(2Count)</first>
<second>12</second>
</item>
<item>
<first>LUT</first>
<second>15</second>
</item>
</second>
</item>
<item>
<first>i_1_phi_fu_311_p4</first>
<second>
<count>4</count>
<item_version>0</item_version>
<item>
<first>(0Size)</first>
<second>2</second>
</item>
<item>
<first>(1Bits)</first>
<second>4</second>
</item>
<item>
<first>(2Count)</first>
<second>8</second>
</item>
<item>
<first>LUT</first>
<second>9</second>
</item>
</second>
</item>
<item>
<first>i_1_reg_307</first>
<second>
<count>4</count>
<item_version>0</item_version>
<item>
<first>(0Size)</first>
<second>2</second>
</item>
<item>
<first>(1Bits)</first>
<second>4</second>
</item>
<item>
<first>(2Count)</first>
<second>8</second>
</item>
<item>
<first>LUT</first>
<second>9</second>
</item>
</second>
</item>
<item>
<first>i_2_reg_318</first>
<second>
<count>4</count>
<item_version>0</item_version>
<item>
<first>(0Size)</first>
<second>2</second>
</item>
<item>
<first>(1Bits)</first>
<second>4</second>
</item>
<item>
<first>(2Count)</first>
<second>8</second>
</item>
<item>
<first>LUT</first>
<second>9</second>
</item>
</second>
</item>
<item>
<first>i_3_phi_fu_356_p4</first>
<second>
<count>4</count>
<item_version>0</item_version>
<item>
<first>(0Size)</first>
<second>2</second>
</item>
<item>
<first>(1Bits)</first>
<second>4</second>
</item>
<item>
<first>(2Count)</first>
<second>8</second>
</item>
<item>
<first>LUT</first>
<second>9</second>
</item>
</second>
</item>
<item>
<first>i_3_reg_352</first>
<second>
<count>4</count>
<item_version>0</item_version>
<item>
<first>(0Size)</first>
<second>2</second>
</item>
<item>
<first>(1Bits)</first>
<second>4</second>
</item>
<item>
<first>(2Count)</first>
<second>8</second>
</item>
<item>
<first>LUT</first>
<second>9</second>
</item>
</second>
</item>
<item>
<first>i_reg_273</first>
<second>
<count>4</count>
<item_version>0</item_version>
<item>
<first>(0Size)</first>
<second>2</second>
</item>
<item>
<first>(1Bits)</first>
<second>4</second>
</item>
<item>
<first>(2Count)</first>
<second>8</second>
</item>
<item>
<first>LUT</first>
<second>9</second>
</item>
</second>
</item>
<item>
<first>in_block_0_ce0</first>
<second>
<count>4</count>
<item_version>0</item_version>
<item>
<first>(0Size)</first>
<second>2</second>
</item>
<item>
<first>(1Bits)</first>
<second>1</second>
</item>
<item>
<first>(2Count)</first>
<second>2</second>
</item>
<item>
<first>LUT</first>
<second>9</second>
</item>
</second>
</item>
<item>
<first>in_block_1_ce0</first>
<second>
<count>4</count>
<item_version>0</item_version>
<item>
<first>(0Size)</first>
<second>2</second>
</item>
<item>
<first>(1Bits)</first>
<second>1</second>
</item>
<item>
<first>(2Count)</first>
<second>2</second>
</item>
<item>
<first>LUT</first>
<second>9</second>
</item>
</second>
</item>
<item>
<first>in_block_2_ce0</first>
<second>
<count>4</count>
<item_version>0</item_version>
<item>
<first>(0Size)</first>
<second>2</second>
</item>
<item>
<first>(1Bits)</first>
<second>1</second>
</item>
<item>
<first>(2Count)</first>
<second>2</second>
</item>
<item>
<first>LUT</first>
<second>9</second>
</item>
</second>
</item>
<item>
<first>in_block_3_ce0</first>
<second>
<count>4</count>
<item_version>0</item_version>
<item>
<first>(0Size)</first>
<second>2</second>
</item>
<item>
<first>(1Bits)</first>
<second>1</second>
</item>
<item>
<first>(2Count)</first>
<second>2</second>
</item>
<item>
<first>LUT</first>
<second>9</second>
</item>
</second>
</item>
<item>
<first>in_block_4_ce0</first>
<second>
<count>4</count>
<item_version>0</item_version>
<item>
<first>(0Size)</first>
<second>2</second>
</item>
<item>
<first>(1Bits)</first>
<second>1</second>
</item>
<item>
<first>(2Count)</first>
<second>2</second>
</item>
<item>
<first>LUT</first>
<second>9</second>
</item>
</second>
</item>
<item>
<first>in_block_5_ce0</first>
<second>
<count>4</count>
<item_version>0</item_version>
<item>
<first>(0Size)</first>
<second>2</second>
</item>
<item>
<first>(1Bits)</first>
<second>1</second>
</item>
<item>
<first>(2Count)</first>
<second>2</second>
</item>
<item>
<first>LUT</first>
<second>9</second>
</item>
</second>
</item>
<item>
<first>in_block_6_ce0</first>
<second>
<count>4</count>
<item_version>0</item_version>
<item>
<first>(0Size)</first>
<second>2</second>
</item>
<item>
<first>(1Bits)</first>
<second>1</second>
</item>
<item>
<first>(2Count)</first>
<second>2</second>
</item>
<item>
<first>LUT</first>
<second>9</second>
</item>
</second>
</item>
<item>
<first>in_block_7_ce0</first>
<second>
<count>4</count>
<item_version>0</item_version>
<item>
<first>(0Size)</first>
<second>2</second>
</item>
<item>
<first>(1Bits)</first>
<second>1</second>
</item>
<item>
<first>(2Count)</first>
<second>2</second>
</item>
<item>
<first>LUT</first>
<second>9</second>
</item>
</second>
</item>
<item>
<first>indvar_flatten1_reg_330</first>
<second>
<count>4</count>
<item_version>0</item_version>
<item>
<first>(0Size)</first>
<second>2</second>
</item>
<item>
<first>(1Bits)</first>
<second>7</second>
</item>
<item>
<first>(2Count)</first>
<second>14</second>
</item>
<item>
<first>LUT</first>
<second>9</second>
</item>
</second>
</item>
<item>
<first>indvar_flatten_reg_285</first>
<second>
<count>4</count>
<item_version>0</item_version>
<item>
<first>(0Size)</first>
<second>2</second>
</item>
<item>
<first>(1Bits)</first>
<second>7</second>
</item>
<item>
<first>(2Count)</first>
<second>14</second>
</item>
<item>
<first>LUT</first>
<second>9</second>
</item>
</second>
</item>
<item>
<first>j_1_phi_fu_345_p4</first>
<second>
<count>4</count>
<item_version>0</item_version>
<item>
<first>(0Size)</first>
<second>2</second>
</item>
<item>
<first>(1Bits)</first>
<second>4</second>
</item>
<item>
<first>(2Count)</first>
<second>8</second>
</item>
<item>
<first>LUT</first>
<second>9</second>
</item>
</second>
</item>
<item>
<first>j_1_reg_341</first>
<second>
<count>4</count>
<item_version>0</item_version>
<item>
<first>(0Size)</first>
<second>2</second>
</item>
<item>
<first>(1Bits)</first>
<second>4</second>
</item>
<item>
<first>(2Count)</first>
<second>8</second>
</item>
<item>
<first>LUT</first>
<second>9</second>
</item>
</second>
</item>
<item>
<first>j_phi_fu_300_p4</first>
<second>
<count>4</count>
<item_version>0</item_version>
<item>
<first>(0Size)</first>
<second>2</second>
</item>
<item>
<first>(1Bits)</first>
<second>4</second>
</item>
<item>
<first>(2Count)</first>
<second>8</second>
</item>
<item>
<first>LUT</first>
<second>9</second>
</item>
</second>
</item>
<item>
<first>j_reg_296</first>
<second>
<count>4</count>
<item_version>0</item_version>
<item>
<first>(0Size)</first>
<second>2</second>
</item>
<item>
<first>(1Bits)</first>
<second>4</second>
</item>
<item>
<first>(2Count)</first>
<second>8</second>
</item>
<item>
<first>LUT</first>
<second>9</second>
</item>
</second>
</item>
<item>
<first>row_outbuf_address0</first>
<second>
<count>4</count>
<item_version>0</item_version>
<item>
<first>(0Size)</first>
<second>3</second>
</item>
<item>
<first>(1Bits)</first>
<second>6</second>
</item>
<item>
<first>(2Count)</first>
<second>18</second>
</item>
<item>
<first>LUT</first>
<second>15</second>
</item>
</second>
</item>
<item>
<first>row_outbuf_ce0</first>
<second>
<count>4</count>
<item_version>0</item_version>
<item>
<first>(0Size)</first>
<second>3</second>
</item>
<item>
<first>(1Bits)</first>
<second>1</second>
</item>
<item>
<first>(2Count)</first>
<second>3</second>
</item>
<item>
<first>LUT</first>
<second>15</second>
</item>
</second>
</item>
<item>
<first>row_outbuf_we0</first>
<second>
<count>4</count>
<item_version>0</item_version>
<item>
<first>(0Size)</first>
<second>2</second>
</item>
<item>
<first>(1Bits)</first>
<second>1</second>
</item>
<item>
<first>(2Count)</first>
<second>2</second>
</item>
<item>
<first>LUT</first>
<second>9</second>
</item>
</second>
</item>
</dp_multiplexer_resource>
<dp_register_resource>
<count>31</count>
<item_version>0</item_version>
<item>
<first>ap_CS_fsm</first>
<second>
<count>3</count>
<item_version>0</item_version>
<item>
<first>(Bits)</first>
<second>9</second>
</item>
<item>
<first>(Consts)</first>
<second>0</second>
</item>
<item>
<first>FF</first>
<second>9</second>
</item>
</second>
</item>
<item>
<first>ap_done_reg</first>
<second>
<count>3</count>
<item_version>0</item_version>
<item>
<first>(Bits)</first>
<second>1</second>
</item>
<item>
<first>(Consts)</first>
<second>0</second>
</item>
<item>
<first>FF</first>
<second>1</second>
</item>
</second>
</item>
<item>
<first>ap_enable_reg_pp0_iter0</first>
<second>
<count>3</count>
<item_version>0</item_version>
<item>
<first>(Bits)</first>
<second>1</second>
</item>
<item>
<first>(Consts)</first>
<second>0</second>
</item>
<item>
<first>FF</first>
<second>1</second>
</item>
</second>
</item>
<item>
<first>ap_enable_reg_pp0_iter1</first>
<second>
<count>3</count>
<item_version>0</item_version>
<item>
<first>(Bits)</first>
<second>1</second>
</item>
<item>
<first>(Consts)</first>
<second>0</second>
</item>
<item>
<first>FF</first>
<second>1</second>
</item>
</second>
</item>
<item>
<first>ap_enable_reg_pp0_iter2</first>
<second>
<count>3</count>
<item_version>0</item_version>
<item>
<first>(Bits)</first>
<second>1</second>
</item>
<item>
<first>(Consts)</first>
<second>0</second>
</item>
<item>
<first>FF</first>
<second>1</second>
</item>
</second>
</item>
<item>
<first>ap_enable_reg_pp1_iter0</first>
<second>
<count>3</count>
<item_version>0</item_version>
<item>
<first>(Bits)</first>
<second>1</second>
</item>
<item>
<first>(Consts)</first>
<second>0</second>
</item>
<item>
<first>FF</first>
<second>1</second>
</item>
</second>
</item>
<item>
<first>ap_enable_reg_pp1_iter1</first>
<second>
<count>3</count>
<item_version>0</item_version>
<item>
<first>(Bits)</first>
<second>1</second>
</item>
<item>
<first>(Consts)</first>
<second>0</second>
</item>
<item>
<first>FF</first>
<second>1</second>
</item>
</second>
</item>
<item>
<first>ap_enable_reg_pp1_iter2</first>
<second>
<count>3</count>
<item_version>0</item_version>
<item>
<first>(Bits)</first>
<second>1</second>
</item>
<item>
<first>(Consts)</first>
<second>0</second>
</item>
<item>
<first>FF</first>
<second>1</second>
</item>
</second>
</item>
<item>
<first>ap_reg_grp_dct_1d_fu_363_ap_start</first>
<second>
<count>3</count>
<item_version>0</item_version>
<item>
<first>(Bits)</first>
<second>1</second>
</item>
<item>
<first>(Consts)</first>
<second>0</second>
</item>
<item>
<first>FF</first>
<second>1</second>
</item>
</second>
</item>
<item>
<first>ap_reg_pp0_iter1_tmp_3_mid2_v_reg_634</first>
<second>
<count>3</count>
<item_version>0</item_version>
<item>
<first>(Bits)</first>
<second>4</second>
</item>
<item>
<first>(Consts)</first>
<second>0</second>
</item>
<item>
<first>FF</first>
<second>4</second>
</item>
</second>
</item>
<item>
<first>ap_reg_pp0_iter1_tmp_3_reg_641</first>
<second>
<count>3</count>
<item_version>0</item_version>
<item>
<first>(Bits)</first>
<second>3</second>
</item>
<item>
<first>(Consts)</first>
<second>0</second>
</item>
<item>
<first>FF</first>
<second>3</second>
</item>
</second>
</item>
<item>
<first>ap_reg_pp1_iter1_exitcond_flatten1_reg_664</first>
<second>
<count>3</count>
<item_version>0</item_version>
<item>
<first>(Bits)</first>
<second>1</second>
</item>
<item>
<first>(Consts)</first>
<second>0</second>
</item>
<item>
<first>FF</first>
<second>1</second>
</item>
</second>
</item>
<item>
<first>ap_reg_pp1_iter1_i_3_mid2_reg_673</first>
<second>
<count>3</count>
<item_version>0</item_version>
<item>
<first>(Bits)</first>
<second>4</second>
</item>
<item>
<first>(Consts)</first>
<second>0</second>
</item>
<item>
<first>FF</first>
<second>4</second>
</item>
</second>
</item>
<item>
<first>ap_reg_pp1_iter1_tmp_9_mid2_v_reg_680</first>
<second>
<count>3</count>
<item_version>0</item_version>
<item>
<first>(Bits)</first>
<second>4</second>
</item>
<item>
<first>(Consts)</first>
<second>0</second>
</item>
<item>
<first>FF</first>
<second>4</second>
</item>
</second>
</item>
<item>
<first>exitcond_flatten1_reg_664</first>
<second>
<count>3</count>
<item_version>0</item_version>
<item>
<first>(Bits)</first>
<second>1</second>
</item>
<item>
<first>(Consts)</first>
<second>0</second>
</item>
<item>
<first>FF</first>
<second>1</second>
</item>
</second>
</item>
<item>
<first>exitcond_flatten_reg_619</first>
<second>
<count>3</count>
<item_version>0</item_version>
<item>
<first>(Bits)</first>
<second>1</second>
</item>
<item>
<first>(Consts)</first>
<second>0</second>
</item>
<item>
<first>FF</first>
<second>1</second>
</item>
</second>
</item>
<item>
<first>i_1_mid2_reg_628</first>
<second>
<count>3</count>
<item_version>0</item_version>
<item>
<first>(Bits)</first>
<second>4</second>
</item>
<item>
<first>(Consts)</first>
<second>0</second>
</item>
<item>
<first>FF</first>
<second>4</second>
</item>
</second>
</item>
<item>
<first>i_1_reg_307</first>
<second>
<count>3</count>
<item_version>0</item_version>
<item>
<first>(Bits)</first>
<second>4</second>
</item>
<item>
<first>(Consts)</first>
<second>0</second>
</item>
<item>
<first>FF</first>
<second>4</second>
</item>
</second>
</item>
<item>
<first>i_2_reg_318</first>
<second>
<count>3</count>
<item_version>0</item_version>
<item>
<first>(Bits)</first>
<second>4</second>
</item>
<item>
<first>(Consts)</first>
<second>0</second>
</item>
<item>
<first>FF</first>
<second>4</second>
</item>
</second>
</item>
<item>
<first>i_3_mid2_reg_673</first>
<second>
<count>3</count>
<item_version>0</item_version>
<item>
<first>(Bits)</first>
<second>4</second>
</item>
<item>
<first>(Consts)</first>
<second>0</second>
</item>
<item>
<first>FF</first>
<second>4</second>
</item>
</second>
</item>
<item>
<first>i_3_reg_352</first>
<second>
<count>3</count>
<item_version>0</item_version>
<item>
<first>(Bits)</first>
<second>4</second>
</item>
<item>
<first>(Consts)</first>
<second>0</second>
</item>
<item>
<first>FF</first>
<second>4</second>
</item>
</second>
</item>
<item>
<first>i_4_reg_614</first>
<second>
<count>3</count>
<item_version>0</item_version>
<item>
<first>(Bits)</first>
<second>4</second>
</item>
<item>
<first>(Consts)</first>
<second>0</second>
</item>
<item>
<first>FF</first>
<second>4</second>
</item>
</second>
</item>
<item>
<first>i_5_reg_659</first>
<second>
<count>3</count>
<item_version>0</item_version>
<item>
<first>(Bits)</first>
<second>4</second>
</item>
<item>
<first>(Consts)</first>
<second>0</second>
</item>
<item>
<first>FF</first>
<second>4</second>
</item>
</second>
</item>
<item>
<first>i_reg_273</first>
<second>
<count>3</count>
<item_version>0</item_version>
<item>
<first>(Bits)</first>
<second>4</second>
</item>
<item>
<first>(Consts)</first>
<second>0</second>
</item>
<item>
<first>FF</first>
<second>4</second>
</item>
</second>
</item>
<item>
<first>indvar_flatten1_reg_330</first>
<second>
<count>3</count>
<item_version>0</item_version>
<item>
<first>(Bits)</first>
<second>7</second>
</item>
<item>
<first>(Consts)</first>
<second>0</second>
</item>
<item>
<first>FF</first>
<second>7</second>
</item>
</second>
</item>
<item>
<first>indvar_flatten_reg_285</first>
<second>
<count>3</count>
<item_version>0</item_version>
<item>
<first>(Bits)</first>
<second>7</second>
</item>
<item>
<first>(Consts)</first>
<second>0</second>
</item>
<item>
<first>FF</first>
<second>7</second>
</item>
</second>
</item>
<item>
<first>j_1_reg_341</first>
<second>
<count>3</count>
<item_version>0</item_version>
<item>
<first>(Bits)</first>
<second>4</second>
</item>
<item>
<first>(Consts)</first>
<second>0</second>
</item>
<item>
<first>FF</first>
<second>4</second>
</item>
</second>
</item>
<item>
<first>j_reg_296</first>
<second>
<count>3</count>
<item_version>0</item_version>
<item>
<first>(Bits)</first>
<second>4</second>
</item>
<item>
<first>(Consts)</first>
<second>0</second>
</item>
<item>
<first>FF</first>
<second>4</second>
</item>
</second>
</item>
<item>
<first>tmp_3_mid2_v_reg_634</first>
<second>
<count>3</count>
<item_version>0</item_version>
<item>
<first>(Bits)</first>
<second>4</second>
</item>
<item>
<first>(Consts)</first>
<second>0</second>
</item>
<item>
<first>FF</first>
<second>4</second>
</item>
</second>
</item>
<item>
<first>tmp_3_reg_641</first>
<second>
<count>3</count>
<item_version>0</item_version>
<item>
<first>(Bits)</first>
<second>3</second>
</item>
<item>
<first>(Consts)</first>
<second>0</second>
</item>
<item>
<first>FF</first>
<second>3</second>
</item>
</second>
</item>
<item>
<first>tmp_9_mid2_v_reg_680</first>
<second>
<count>3</count>
<item_version>0</item_version>
<item>
<first>(Bits)</first>
<second>4</second>
</item>
<item>
<first>(Consts)</first>
<second>0</second>
</item>
<item>
<first>FF</first>
<second>4</second>
</item>
</second>
</item>
</dp_register_resource>
<dp_component_map class_id="41" tracking_level="0" version="0">
<count>1</count>
<item_version>0</item_version>
<item class_id="42" tracking_level="0" version="0">
<first>grp_dct_1d_fu_363 (dct_1d)</first>
<second>
<count>2</count>
<item_version>0</item_version>
<item>37</item>
<item>114</item>
</second>
</item>
</dp_component_map>
<dp_expression_map>
<count>21</count>
<item_version>0</item_version>
<item>
<first>exitcond_flatten1_fu_515_p2 ( icmp ) </first>
<second>
<count>1</count>
<item_version>0</item_version>
<item>122</item>
</second>
</item>
<item>
<first>exitcond_flatten_fu_418_p2 ( icmp ) </first>
<second>
<count>1</count>
<item_version>0</item_version>
<item>45</item>
</second>
</item>
<item>
<first>i_1_mid2_fu_442_p3 ( select ) </first>
<second>
<count>1</count>
<item_version>0</item_version>
<item>53</item>
</second>
</item>
<item>
<first>i_3_mid2_fu_539_p3 ( select ) </first>
<second>
<count>1</count>
<item_version>0</item_version>
<item>130</item>
</second>
</item>
<item>
<first>i_4_fu_412_p2 ( + ) </first>
<second>
<count>1</count>
<item_version>0</item_version>
<item>33</item>
</second>
</item>
<item>
<first>i_5_fu_509_p2 ( + ) </first>
<second>
<count>1</count>
<item_version>0</item_version>
<item>110</item>
</second>
</item>
<item>
<first>i_6_fu_487_p2 ( + ) </first>
<second>
<count>1</count>
<item_version>0</item_version>
<item>102</item>
</second>
</item>
<item>
<first>i_7_fu_580_p2 ( + ) </first>
<second>
<count>1</count>
<item_version>0</item_version>
<item>150</item>
</second>
</item>
<item>
<first>indvar_flatten_next1_fu_521_p2 ( + ) </first>
<second>
<count>1</count>
<item_version>0</item_version>
<item>123</item>
</second>
</item>
<item>
<first>indvar_flatten_next_fu_424_p2 ( + ) </first>
<second>
<count>1</count>
<item_version>0</item_version>
<item>46</item>
</second>
</item>
<item>
<first>j_2_fu_430_p2 ( + ) </first>
<second>
<count>1</count>
<item_version>0</item_version>
<item>49</item>
</second>
</item>
<item>
<first>j_3_fu_527_p2 ( + ) </first>
<second>
<count>1</count>
<item_version>0</item_version>
<item>126</item>
</second>
</item>
<item>
<first>tmp_11_fu_569_p2 ( + ) </first>
<second>
<count>1</count>
<item_version>0</item_version>
<item>144</item>
</second>
</item>
<item>
<first>tmp_1_fu_436_p2 ( icmp ) </first>
<second>
<count>1</count>
<item_version>0</item_version>
<item>52</item>
</second>
</item>
<item>
<first>tmp_2_fu_476_p2 ( + ) </first>
<second>
<count>1</count>
<item_version>0</item_version>
<item>62</item>
</second>
</item>
<item>
<first>tmp_3_mid2_v_fu_450_p3 ( select ) </first>
<second>
<count>1</count>
<item_version>0</item_version>
<item>54</item>
</second>
</item>
<item>
<first>tmp_4_fu_503_p2 ( icmp ) </first>
<second>
<count>1</count>
<item_version>0</item_version>
<item>108</item>
</second>
</item>
<item>
<first>tmp_5_fu_533_p2 ( icmp ) </first>
<second>
<count>1</count>
<item_version>0</item_version>
<item>129</item>
</second>
</item>
<item>
<first>tmp_9_fu_599_p2 ( + ) </first>
<second>
<count>1</count>
<item_version>0</item_version>
<item>139</item>
</second>
</item>
<item>
<first>tmp_9_mid2_v_fu_547_p3 ( select ) </first>
<second>
<count>1</count>
<item_version>0</item_version>
<item>131</item>
</second>
</item>
<item>
<first>tmp_fu_406_p2 ( icmp ) </first>
<second>
<count>1</count>
<item_version>0</item_version>
<item>31</item>
</second>
</item>
</dp_expression_map>
<dp_fifo_map>
<count>0</count>
<item_version>0</item_version>
</dp_fifo_map>
<dp_memory_map>
<count>10</count>
<item_version>0</item_version>
<item>
<first>col_inbuf_0_U</first>
<second>
<count>1</count>
<item_version>0</item_version>
<item>255</item>
</second>
</item>
<item>
<first>col_inbuf_1_U</first>
<second>
<count>1</count>
<item_version>0</item_version>
<item>264</item>
</second>
</item>
<item>
<first>col_inbuf_2_U</first>
<second>
<count>1</count>
<item_version>0</item_version>
<item>273</item>
</second>
</item>
<item>
<first>col_inbuf_3_U</first>
<second>
<count>1</count>
<item_version>0</item_version>
<item>282</item>
</second>
</item>
<item>
<first>col_inbuf_4_U</first>
<second>
<count>1</count>
<item_version>0</item_version>
<item>291</item>
</second>
</item>
<item>
<first>col_inbuf_5_U</first>
<second>
<count>1</count>
<item_version>0</item_version>
<item>300</item>
</second>
</item>
<item>
<first>col_inbuf_6_U</first>
<second>
<count>1</count>
<item_version>0</item_version>
<item>309</item>
</second>
</item>
<item>
<first>col_inbuf_7_U</first>
<second>
<count>1</count>
<item_version>0</item_version>
<item>318</item>
</second>
</item>
<item>
<first>col_outbuf_U</first>
<second>
<count>1</count>
<item_version>0</item_version>
<item>245</item>
</second>
</item>
<item>
<first>row_outbuf_U</first>
<second>
<count>1</count>
<item_version>0</item_version>
<item>236</item>
</second>
</item>
</dp_memory_map>
</res>
<node_label_latency class_id="43" tracking_level="0" version="0">
<count>99</count>
<item_version>0</item_version>
<item class_id="44" tracking_level="0" version="0">
<first>18</first>
<second class_id="45" tracking_level="0" version="0">
<first>0</first>
<second>0</second>
</second>
</item>
<item>
<first>19</first>
<second>
<first>0</first>
<second>0</second>
</second>
</item>
<item>
<first>20</first>
<second>
<first>0</first>
<second>0</second>
</second>
</item>
<item>
<first>21</first>
<second>
<first>0</first>
<second>0</second>
</second>
</item>
<item>
<first>22</first>
<second>
<first>0</first>
<second>0</second>
</second>
</item>
<item>
<first>23</first>
<second>
<first>0</first>
<second>0</second>
</second>
</item>
<item>
<first>24</first>
<second>
<first>0</first>
<second>0</second>
</second>
</item>
<item>
<first>25</first>
<second>
<first>0</first>
<second>0</second>
</second>
</item>
<item>
<first>26</first>
<second>
<first>0</first>
<second>0</second>
</second>
</item>
<item>
<first>27</first>
<second>
<first>0</first>
<second>0</second>
</second>
</item>
<item>
<first>28</first>
<second>
<first>0</first>
<second>0</second>
</second>
</item>
<item>
<first>30</first>
<second>
<first>1</first>
<second>0</second>
</second>
</item>
<item>
<first>31</first>
<second>
<first>1</first>
<second>0</second>
</second>
</item>
<item>
<first>33</first>
<second>
<first>1</first>
<second>0</second>
</second>
</item>
<item>
<first>34</first>
<second>
<first>1</first>
<second>0</second>
</second>
</item>
<item>
<first>37</first>
<second>
<first>1</first>
<second>1</second>
</second>
</item>
<item>
<first>38</first>
<second>
<first>2</first>
<second>0</second>
</second>
</item>
<item>
<first>40</first>
<second>
<first>1</first>
<second>0</second>
</second>
</item>
<item>
<first>42</first>
<second>
<first>2</first>
<second>0</second>
</second>
</item>
<item>
<first>43</first>
<second>
<first>2</first>
<second>0</second>
</second>
</item>
<item>
<first>44</first>
<second>
<first>2</first>
<second>0</second>
</second>
</item>
<item>
<first>45</first>
<second>
<first>2</first>
<second>0</second>
</second>
</item>
<item>
<first>46</first>
<second>
<first>2</first>
<second>0</second>
</second>
</item>
<item>
<first>47</first>
<second>
<first>2</first>
<second>0</second>
</second>
</item>
<item>
<first>49</first>
<second>
<first>2</first>
<second>0</second>
</second>
</item>
<item>
<first>52</first>
<second>
<first>2</first>
<second>0</second>
</second>
</item>
<item>
<first>53</first>
<second>
<first>2</first>
<second>0</second>
</second>
</item>
<item>
<first>54</first>
<second>
<first>2</first>
<second>0</second>
</second>
</item>
<item>
<first>55</first>
<second>
<first>4</first>
<second>0</second>
</second>
</item>
<item>
<first>56</first>
<second>
<first>3</first>
<second>0</second>
</second>
</item>
<item>
<first>60</first>
<second>
<first>3</first>
<second>0</second>
</second>
</item>
<item>
<first>61</first>
<second>
<first>3</first>
<second>0</second>
</second>
</item>
<item>
<first>62</first>
<second>
<first>3</first>
<second>0</second>
</second>
</item>
<item>
<first>63</first>
<second>
<first>3</first>
<second>0</second>
</second>
</item>
<item>
<first>64</first>
<second>
<first>3</first>
<second>0</second>
</second>
</item>
<item>
<first>65</first>
<second>
<first>3</first>
<second>1</second>
</second>
</item>
<item>
<first>66</first>
<second>
<first>2</first>
<second>0</second>
</second>
</item>
<item>
<first>67</first>
<second>
<first>3</first>
<second>0</second>
</second>
</item>
<item>
<first>69</first>
<second>
<first>4</first>
<second>0</second>
</second>
</item>
<item>
<first>70</first>
<second>
<first>4</first>
<second>0</second>
</second>
</item>
<item>
<first>71</first>
<second>
<first>2</first>
<second>0</second>
</second>
</item>
<item>
<first>73</first>
<second>
<first>4</first>
<second>0</second>
</second>
</item>
<item>
<first>74</first>
<second>
<first>4</first>
<second>0</second>
</second>
</item>
<item>
<first>75</first>
<second>
<first>2</first>
<second>0</second>
</second>
</item>
<item>
<first>77</first>
<second>
<first>4</first>
<second>0</second>
</second>
</item>
<item>
<first>78</first>
<second>
<first>4</first>
<second>0</second>
</second>
</item>
<item>
<first>79</first>
<second>
<first>2</first>
<second>0</second>
</second>
</item>
<item>
<first>81</first>
<second>
<first>4</first>
<second>0</second>
</second>
</item>
<item>
<first>82</first>
<second>
<first>4</first>
<second>0</second>
</second>
</item>
<item>
<first>83</first>
<second>
<first>2</first>
<second>0</second>
</second>
</item>
<item>
<first>85</first>
<second>
<first>4</first>
<second>0</second>
</second>
</item>
<item>
<first>86</first>
<second>
<first>4</first>
<second>0</second>
</second>
</item>
<item>
<first>87</first>
<second>
<first>2</first>
<second>0</second>
</second>
</item>
<item>
<first>89</first>
<second>
<first>4</first>
<second>0</second>
</second>
</item>
<item>
<first>90</first>
<second>
<first>4</first>
<second>0</second>
</second>
</item>
<item>
<first>91</first>
<second>
<first>2</first>
<second>0</second>
</second>
</item>
<item>
<first>93</first>
<second>
<first>4</first>
<second>0</second>
</second>
</item>
<item>
<first>94</first>
<second>
<first>4</first>
<second>0</second>
</second>
</item>
<item>
<first>95</first>
<second>
<first>2</first>
<second>0</second>
</second>
</item>
<item>
<first>97</first>
<second>
<first>4</first>
<second>0</second>
</second>
</item>
<item>
<first>98</first>
<second>
<first>4</first>
<second>0</second>
</second>
</item>
<item>
<first>99</first>
<second>
<first>2</first>
<second>0</second>
</second>
</item>
<item>
<first>102</first>
<second>
<first>3</first>
<second>0</second>
</second>
</item>
<item>
<first>103</first>
<second>
<first>4</first>
<second>0</second>
</second>
</item>
<item>
<first>105</first>
<second>
<first>3</first>
<second>0</second>
</second>
</item>
<item>
<first>107</first>
<second>
<first>4</first>
<second>0</second>
</second>
</item>
<item>
<first>108</first>
<second>
<first>4</first>
<second>0</second>
</second>
</item>
<item>
<first>110</first>
<second>
<first>4</first>
<second>0</second>
</second>
</item>
<item>
<first>111</first>
<second>
<first>4</first>
<second>0</second>
</second>
</item>
<item>
<first>114</first>
<second>
<first>4</first>
<second>1</second>
</second>
</item>
<item>
<first>115</first>
<second>
<first>5</first>
<second>0</second>
</second>
</item>
<item>
<first>117</first>
<second>
<first>4</first>
<second>0</second>
</second>
</item>
<item>
<first>119</first>
<second>
<first>5</first>
<second>0</second>
</second>
</item>
<item>
<first>120</first>
<second>
<first>5</first>
<second>0</second>
</second>
</item>
<item>
<first>121</first>
<second>
<first>5</first>
<second>0</second>
</second>
</item>
<item>
<first>122</first>
<second>
<first>5</first>
<second>0</second>
</second>
</item>
<item>
<first>123</first>
<second>
<first>5</first>
<second>0</second>
</second>
</item>
<item>
<first>124</first>
<second>
<first>5</first>
<second>0</second>
</second>
</item>
<item>
<first>126</first>
<second>
<first>5</first>
<second>0</second>
</second>
</item>
<item>
<first>129</first>
<second>
<first>5</first>
<second>0</second>
</second>
</item>
<item>
<first>130</first>
<second>
<first>5</first>
<second>0</second>
</second>
</item>
<item>
<first>131</first>
<second>
<first>5</first>
<second>0</second>
</second>
</item>
<item>
<first>132</first>
<second>
<first>6</first>
<second>0</second>
</second>
</item>
<item>
<first>133</first>
<second>
<first>7</first>
<second>0</second>
</second>
</item>
<item>
<first>134</first>
<second>
<first>7</first>
<second>0</second>
</second>
</item>
<item>
<first>138</first>
<second>
<first>7</first>
<second>0</second>
</second>
</item>
<item>
<first>139</first>
<second>
<first>7</first>
<second>0</second>
</second>
</item>
<item>
<first>140</first>
<second>
<first>7</first>
<second>0</second>
</second>
</item>
<item>
<first>141</first>
<second>
<first>7</first>
<second>0</second>
</second>
</item>
<item>
<first>142</first>
<second>
<first>6</first>
<second>0</second>
</second>
</item>
<item>
<first>143</first>
<second>
<first>6</first>
<second>0</second>
</second>
</item>
<item>
<first>144</first>
<second>
<first>6</first>
<second>0</second>
</second>
</item>
<item>
<first>145</first>
<second>
<first>6</first>
<second>0</second>
</second>
</item>
<item>
<first>146</first>
<second>
<first>6</first>
<second>0</second>
</second>
</item>
<item>
<first>147</first>
<second>
<first>6</first>
<second>1</second>
</second>
</item>
<item>
<first>148</first>
<second>
<first>7</first>
<second>0</second>
</second>
</item>
<item>
<first>150</first>
<second>
<first>6</first>
<second>0</second>
</second>
</item>
<item>
<first>151</first>
<second>
<first>7</first>
<second>0</second>
</second>
</item>
<item>
<first>153</first>
<second>
<first>6</first>
<second>0</second>
</second>
</item>
</node_label_latency>
<bblk_ent_exit class_id="46" tracking_level="0" version="0">
<count>22</count>
<item_version>0</item_version>
<item class_id="47" tracking_level="0" version="0">
<first>29</first>
<second class_id="48" tracking_level="0" version="0">
<first>0</first>
<second>0</second>
</second>
</item>
<item>
<first>35</first>
<second>
<first>1</first>
<second>1</second>
</second>
</item>
<item>
<first>39</first>
<second>
<first>1</first>
<second>2</second>
</second>
</item>
<item>
<first>41</first>
<second>
<first>1</first>
<second>1</second>
</second>
</item>
<item>
<first>48</first>
<second>
<first>2</first>
<second>2</second>
</second>
</item>
<item>
<first>68</first>
<second>
<first>2</first>
<second>4</second>
</second>
</item>
<item>
<first>72</first>
<second>
<first>2</first>
<second>4</second>
</second>
</item>
<item>
<first>76</first>
<second>
<first>2</first>
<second>4</second>
</second>
</item>
<item>
<first>80</first>
<second>
<first>2</first>
<second>4</second>
</second>
</item>
<item>
<first>84</first>
<second>
<first>2</first>
<second>4</second>
</second>
</item>
<item>
<first>88</first>
<second>
<first>2</first>
<second>4</second>
</second>
</item>
<item>
<first>92</first>
<second>
<first>2</first>
<second>4</second>
</second>
</item>
<item>
<first>96</first>
<second>
<first>2</first>
<second>4</second>
</second>
</item>
<item>
<first>100</first>
<second>
<first>2</first>
<second>4</second>
</second>
</item>
<item>
<first>104</first>
<second>
<first>3</first>
<second>4</second>
</second>
</item>
<item>
<first>106</first>
<second>
<first>3</first>
<second>3</second>
</second>
</item>
<item>
<first>112</first>
<second>
<first>4</first>
<second>4</second>
</second>
</item>
<item>
<first>116</first>
<second>
<first>4</first>
<second>5</second>
</second>
</item>
<item>
<first>118</first>
<second>
<first>4</first>
<second>4</second>
</second>
</item>
<item>
<first>125</first>
<second>
<first>5</first>
<second>5</second>
</second>
</item>
<item>
<first>152</first>
<second>
<first>5</first>
<second>7</second>
</second>
</item>
<item>
<first>154</first>
<second>
<first>6</first>
<second>6</second>
</second>
</item>
</bblk_ent_exit>
<regions class_id="49" tracking_level="0" version="0">
<count>2</count>
<item_version>0</item_version>
<item class_id="50" tracking_level="1" version="0" object_id="_581">
<region_name>Xpose_Row_Outer_Loop_Xpose_Row_Inner_Loop</region_name>
<basic_blocks>
<count>11</count>
<item_version>0</item_version>
<item>48</item>
<item>68</item>
<item>72</item>
<item>76</item>
<item>80</item>
<item>84</item>
<item>88</item>
<item>92</item>
<item>96</item>
<item>100</item>
<item>104</item>
</basic_blocks>
<nodes>
<count>0</count>
<item_version>0</item_version>
</nodes>
<anchor_node>-1</anchor_node>
<region_type>8</region_type>
<interval>1</interval>
<pipe_depth>3</pipe_depth>
</item>
<item class_id_reference="50" object_id="_582">
<region_name>Xpose_Col_Outer_Loop_Xpose_Col_Inner_Loop</region_name>
<basic_blocks>
<count>2</count>
<item_version>0</item_version>
<item>125</item>
<item>152</item>
</basic_blocks>
<nodes>
<count>0</count>
<item_version>0</item_version>
</nodes>
<anchor_node>-1</anchor_node>
<region_type>8</region_type>
<interval>1</interval>
<pipe_depth>3</pipe_depth>
</item>
</regions>
<dp_fu_nodes class_id="51" tracking_level="0" version="0">
<count>76</count>
<item_version>0</item_version>
<item class_id="52" tracking_level="0" version="0">
<first>102</first>
<second>
<count>1</count>
<item_version>0</item_version>
<item>18</item>
</second>
</item>
<item>
<first>106</first>
<second>
<count>1</count>
<item_version>0</item_version>
<item>19</item>
</second>
</item>
<item>
<first>110</first>
<second>
<count>1</count>
<item_version>0</item_version>
<item>20</item>
</second>
</item>
<item>
<first>114</first>
<second>
<count>1</count>
<item_version>0</item_version>
<item>21</item>
</second>
</item>
<item>
<first>118</first>
<second>
<count>1</count>
<item_version>0</item_version>
<item>22</item>
</second>
</item>
<item>
<first>122</first>
<second>
<count>1</count>
<item_version>0</item_version>
<item>23</item>
</second>
</item>
<item>
<first>126</first>
<second>
<count>1</count>
<item_version>0</item_version>
<item>24</item>
</second>
</item>
<item>
<first>130</first>
<second>
<count>1</count>
<item_version>0</item_version>
<item>25</item>
</second>
</item>
<item>
<first>134</first>
<second>
<count>1</count>
<item_version>0</item_version>
<item>26</item>
</second>
</item>
<item>
<first>138</first>
<second>
<count>1</count>
<item_version>0</item_version>
<item>27</item>
</second>
</item>
<item>
<first>142</first>
<second>
<count>1</count>
<item_version>0</item_version>
<item>64</item>
</second>
</item>
<item>
<first>148</first>
<second>
<count>2</count>
<item_version>0</item_version>
<item>65</item>
<item>65</item>
</second>
</item>
<item>
<first>153</first>
<second>
<count>1</count>
<item_version>0</item_version>
<item>69</item>
</second>
</item>
<item>
<first>159</first>
<second>
<count>1</count>
<item_version>0</item_version>
<item>70</item>
</second>
</item>
<item>
<first>165</first>
<second>
<count>1</count>
<item_version>0</item_version>
<item>73</item>
</second>
</item>
<item>
<first>171</first>
<second>
<count>1</count>
<item_version>0</item_version>
<item>74</item>
</second>
</item>
<item>
<first>177</first>
<second>
<count>1</count>
<item_version>0</item_version>
<item>77</item>
</second>
</item>
<item>
<first>183</first>
<second>
<count>1</count>
<item_version>0</item_version>
<item>78</item>
</second>
</item>
<item>
<first>189</first>
<second>
<count>1</count>
<item_version>0</item_version>
<item>81</item>
</second>
</item>
<item>
<first>195</first>
<second>
<count>1</count>
<item_version>0</item_version>
<item>82</item>
</second>
</item>
<item>
<first>201</first>
<second>
<count>1</count>
<item_version>0</item_version>
<item>85</item>
</second>
</item>
<item>
<first>207</first>
<second>
<count>1</count>
<item_version>0</item_version>
<item>86</item>
</second>
</item>
<item>
<first>213</first>
<second>
<count>1</count>
<item_version>0</item_version>
<item>89</item>
</second>
</item>
<item>
<first>219</first>
<second>
<count>1</count>
<item_version>0</item_version>
<item>90</item>
</second>
</item>
<item>
<first>225</first>
<second>
<count>1</count>
<item_version>0</item_version>
<item>93</item>
</second>
</item>
<item>
<first>231</first>
<second>
<count>1</count>
<item_version>0</item_version>
<item>94</item>
</second>
</item>
<item>
<first>237</first>
<second>
<count>1</count>
<item_version>0</item_version>
<item>97</item>
</second>
</item>
<item>
<first>243</first>
<second>
<count>1</count>
<item_version>0</item_version>
<item>98</item>
</second>
</item>
<item>
<first>249</first>
<second>
<count>1</count>
<item_version>0</item_version>
<item>146</item>
</second>
</item>
<item>
<first>255</first>
<second>
<count>2</count>
<item_version>0</item_version>
<item>147</item>
<item>147</item>
</second>
</item>
<item>
<first>260</first>
<second>
<count>1</count>
<item_version>0</item_version>
<item>141</item>
</second>
</item>
<item>
<first>267</first>
<second>
<count>1</count>
<item_version>0</item_version>
<item>148</item>
</second>
</item>
<item>
<first>277</first>
<second>
<count>1</count>
<item_version>0</item_version>
<item>30</item>
</second>
</item>
<item>
<first>289</first>
<second>
<count>1</count>
<item_version>0</item_version>
<item>42</item>
</second>
</item>
<item>
<first>300</first>
<second>
<count>1</count>
<item_version>0</item_version>
<item>43</item>
</second>
</item>
<item>
<first>311</first>
<second>
<count>1</count>
<item_version>0</item_version>
<item>44</item>
</second>
</item>
<item>
<first>322</first>
<second>
<count>1</count>
<item_version>0</item_version>
<item>107</item>
</second>
</item>
<item>
<first>334</first>
<second>
<count>1</count>
<item_version>0</item_version>
<item>119</item>
</second>
</item>
<item>
<first>345</first>
<second>
<count>1</count>
<item_version>0</item_version>
<item>120</item>
</second>
</item>
<item>
<first>356</first>
<second>
<count>1</count>
<item_version>0</item_version>
<item>121</item>
</second>
</item>
<item>
<first>363</first>
<second>
<count>4</count>
<item_version>0</item_version>
<item>37</item>
<item>37</item>
<item>114</item>
<item>114</item>
</second>
</item>
<item>
<first>406</first>
<second>
<count>1</count>
<item_version>0</item_version>
<item>31</item>
</second>
</item>
<item>
<first>412</first>
<second>
<count>1</count>
<item_version>0</item_version>
<item>33</item>
</second>
</item>
<item>
<first>418</first>
<second>
<count>1</count>
<item_version>0</item_version>
<item>45</item>
</second>
</item>
<item>
<first>424</first>
<second>
<count>1</count>
<item_version>0</item_version>
<item>46</item>
</second>
</item>
<item>
<first>430</first>
<second>
<count>1</count>
<item_version>0</item_version>
<item>49</item>
</second>
</item>
<item>
<first>436</first>
<second>
<count>1</count>
<item_version>0</item_version>
<item>52</item>
</second>
</item>
<item>
<first>442</first>
<second>
<count>1</count>
<item_version>0</item_version>
<item>53</item>
</second>
</item>
<item>
<first>450</first>
<second>
<count>1</count>
<item_version>0</item_version>
<item>54</item>
</second>
</item>
<item>
<first>458</first>
<second>
<count>1</count>
<item_version>0</item_version>
<item>66</item>
</second>
</item>
<item>
<first>462</first>
<second>
<count>1</count>
<item_version>0</item_version>
<item>56</item>
</second>
</item>
<item>
<first>465</first>
<second>
<count>1</count>
<item_version>0</item_version>
<item>60</item>
</second>
</item>
<item>
<first>472</first>
<second>
<count>1</count>
<item_version>0</item_version>
<item>61</item>
</second>
</item>
<item>
<first>476</first>
<second>
<count>1</count>
<item_version>0</item_version>
<item>62</item>
</second>
</item>
<item>
<first>482</first>
<second>
<count>1</count>
<item_version>0</item_version>
<item>63</item>
</second>
</item>
<item>
<first>487</first>
<second>
<count>1</count>
<item_version>0</item_version>
<item>102</item>
</second>
</item>
<item>
<first>492</first>
<second>
<count>1</count>
<item_version>0</item_version>
<item>55</item>
</second>
</item>
<item>
<first>503</first>
<second>
<count>1</count>
<item_version>0</item_version>
<item>108</item>
</second>
</item>
<item>
<first>509</first>
<second>
<count>1</count>
<item_version>0</item_version>
<item>110</item>
</second>
</item>
<item>
<first>515</first>
<second>
<count>1</count>
<item_version>0</item_version>
<item>122</item>
</second>
</item>
<item>
<first>521</first>
<second>
<count>1</count>
<item_version>0</item_version>
<item>123</item>
</second>
</item>
<item>
<first>527</first>
<second>
<count>1</count>
<item_version>0</item_version>
<item>126</item>
</second>
</item>
<item>
<first>533</first>
<second>
<count>1</count>
<item_version>0</item_version>
<item>129</item>
</second>
</item>
<item>
<first>539</first>
<second>
<count>1</count>
<item_version>0</item_version>
<item>130</item>
</second>
</item>
<item>
<first>547</first>
<second>
<count>1</count>
<item_version>0</item_version>
<item>131</item>
</second>
</item>
<item>
<first>555</first>
<second>
<count>1</count>
<item_version>0</item_version>
<item>132</item>
</second>
</item>
<item>
<first>558</first>
<second>
<count>1</count>
<item_version>0</item_version>
<item>142</item>
</second>
</item>
<item>
<first>565</first>
<second>
<count>1</count>
<item_version>0</item_version>
<item>143</item>
</second>
</item>
<item>
<first>569</first>
<second>
<count>1</count>
<item_version>0</item_version>
<item>144</item>
</second>
</item>
<item>
<first>575</first>
<second>
<count>1</count>
<item_version>0</item_version>
<item>145</item>
</second>
</item>
<item>
<first>580</first>
<second>
<count>1</count>
<item_version>0</item_version>
<item>150</item>
</second>
</item>
<item>
<first>585</first>
<second>
<count>1</count>
<item_version>0</item_version>
<item>133</item>
</second>
</item>
<item>
<first>592</first>
<second>
<count>1</count>
<item_version>0</item_version>
<item>134</item>
</second>
</item>
<item>
<first>596</first>
<second>
<count>1</count>
<item_version>0</item_version>
<item>138</item>
</second>
</item>
<item>
<first>599</first>
<second>
<count>1</count>
<item_version>0</item_version>
<item>139</item>
</second>
</item>
<item>
<first>605</first>
<second>
<count>1</count>
<item_version>0</item_version>
<item>140</item>
</second>
</item>
</dp_fu_nodes>
<dp_fu_nodes_expression class_id="54" tracking_level="0" version="0">
<count>64</count>
<item_version>0</item_version>
<item class_id="55" tracking_level="0" version="0">
<first>col_inbuf_0_addr_gep_fu_225</first>
<second>
<count>1</count>
<item_version>0</item_version>
<item>93</item>
</second>
</item>
<item>
<first>col_inbuf_0_alloca_fu_110</first>
<second>
<count>1</count>
<item_version>0</item_version>
<item>20</item>
</second>
</item>
<item>
<first>col_inbuf_1_addr_gep_fu_213</first>
<second>
<count>1</count>
<item_version>0</item_version>
<item>89</item>
</second>
</item>
<item>
<first>col_inbuf_1_alloca_fu_114</first>
<second>
<count>1</count>
<item_version>0</item_version>
<item>21</item>
</second>
</item>
<item>
<first>col_inbuf_2_addr_gep_fu_201</first>
<second>
<count>1</count>
<item_version>0</item_version>
<item>85</item>
</second>
</item>
<item>
<first>col_inbuf_2_alloca_fu_118</first>
<second>
<count>1</count>
<item_version>0</item_version>
<item>22</item>
</second>
</item>
<item>
<first>col_inbuf_3_addr_gep_fu_189</first>
<second>
<count>1</count>
<item_version>0</item_version>
<item>81</item>
</second>
</item>
<item>
<first>col_inbuf_3_alloca_fu_122</first>
<second>
<count>1</count>
<item_version>0</item_version>
<item>23</item>
</second>
</item>
<item>
<first>col_inbuf_4_addr_gep_fu_177</first>
<second>
<count>1</count>
<item_version>0</item_version>
<item>77</item>
</second>
</item>
<item>
<first>col_inbuf_4_alloca_fu_126</first>
<second>
<count>1</count>
<item_version>0</item_version>
<item>24</item>
</second>
</item>
<item>
<first>col_inbuf_5_addr_gep_fu_165</first>
<second>
<count>1</count>
<item_version>0</item_version>
<item>73</item>
</second>
</item>
<item>
<first>col_inbuf_5_alloca_fu_130</first>
<second>
<count>1</count>
<item_version>0</item_version>
<item>25</item>
</second>
</item>
<item>
<first>col_inbuf_6_addr_gep_fu_153</first>
<second>
<count>1</count>
<item_version>0</item_version>
<item>69</item>
</second>
</item>
<item>
<first>col_inbuf_6_alloca_fu_134</first>
<second>
<count>1</count>
<item_version>0</item_version>
<item>26</item>
</second>
</item>
<item>
<first>col_inbuf_7_addr_gep_fu_237</first>
<second>
<count>1</count>
<item_version>0</item_version>
<item>97</item>
</second>
</item>
<item>
<first>col_inbuf_7_alloca_fu_138</first>
<second>
<count>1</count>
<item_version>0</item_version>
<item>27</item>
</second>
</item>
<item>
<first>col_outbuf_addr_gep_fu_249</first>
<second>
<count>1</count>
<item_version>0</item_version>
<item>146</item>
</second>
</item>
<item>
<first>col_outbuf_alloca_fu_106</first>
<second>
<count>1</count>
<item_version>0</item_version>
<item>19</item>
</second>
</item>
<item>
<first>exitcond_flatten1_fu_515</first>
<second>
<count>1</count>
<item_version>0</item_version>
<item>122</item>
</second>
</item>
<item>
<first>exitcond_flatten_fu_418</first>
<second>
<count>1</count>
<item_version>0</item_version>
<item>45</item>
</second>
</item>
<item>
<first>i_1_mid2_fu_442</first>
<second>
<count>1</count>
<item_version>0</item_version>
<item>53</item>
</second>
</item>
<item>
<first>i_1_phi_fu_311</first>
<second>
<count>1</count>
<item_version>0</item_version>
<item>44</item>
</second>
</item>
<item>
<first>i_2_phi_fu_322</first>
<second>
<count>1</count>
<item_version>0</item_version>
<item>107</item>
</second>
</item>
<item>
<first>i_3_mid2_fu_539</first>
<second>
<count>1</count>
<item_version>0</item_version>
<item>130</item>
</second>
</item>
<item>
<first>i_3_phi_fu_356</first>
<second>
<count>1</count>
<item_version>0</item_version>
<item>121</item>
</second>
</item>
<item>
<first>i_4_fu_412</first>
<second>
<count>1</count>
<item_version>0</item_version>
<item>33</item>
</second>
</item>
<item>
<first>i_5_fu_509</first>
<second>
<count>1</count>
<item_version>0</item_version>
<item>110</item>
</second>
</item>
<item>
<first>i_6_fu_487</first>
<second>
<count>1</count>
<item_version>0</item_version>
<item>102</item>
</second>
</item>
<item>
<first>i_7_fu_580</first>
<second>
<count>1</count>
<item_version>0</item_version>
<item>150</item>
</second>
</item>
<item>
<first>i_phi_fu_277</first>
<second>
<count>1</count>
<item_version>0</item_version>
<item>30</item>
</second>
</item>
<item>
<first>indvar_flatten1_phi_fu_334</first>
<second>
<count>1</count>
<item_version>0</item_version>
<item>119</item>
</second>
</item>
<item>
<first>indvar_flatten_next1_fu_521</first>
<second>
<count>1</count>
<item_version>0</item_version>
<item>123</item>
</second>
</item>
<item>
<first>indvar_flatten_next_fu_424</first>
<second>
<count>1</count>
<item_version>0</item_version>
<item>46</item>
</second>
</item>
<item>
<first>indvar_flatten_phi_fu_289</first>
<second>
<count>1</count>
<item_version>0</item_version>
<item>42</item>
</second>
</item>
<item>
<first>j_1_phi_fu_345</first>
<second>
<count>1</count>
<item_version>0</item_version>
<item>120</item>
</second>
</item>
<item>
<first>j_2_fu_430</first>
<second>
<count>1</count>
<item_version>0</item_version>
<item>49</item>
</second>
</item>
<item>
<first>j_3_fu_527</first>
<second>
<count>1</count>
<item_version>0</item_version>
<item>126</item>
</second>
</item>
<item>
<first>j_phi_fu_300</first>
<second>
<count>1</count>
<item_version>0</item_version>
<item>43</item>
</second>
</item>
<item>
<first>out_block_addr_gep_fu_260</first>
<second>
<count>1</count>
<item_version>0</item_version>
<item>141</item>
</second>
</item>
<item>
<first>row_outbuf_addr_gep_fu_142</first>
<second>
<count>1</count>
<item_version>0</item_version>
<item>64</item>
</second>
</item>
<item>
<first>row_outbuf_alloca_fu_102</first>
<second>
<count>1</count>
<item_version>0</item_version>
<item>18</item>
</second>
</item>
<item>
<first>tmp_10_fu_558</first>
<second>
<count>1</count>
<item_version>0</item_version>
<item>142</item>
</second>
</item>
<item>
<first>tmp_11_cast_fu_482</first>
<second>
<count>1</count>
<item_version>0</item_version>
<item>63</item>
</second>
</item>
<item>
<first>tmp_11_fu_569</first>
<second>
<count>1</count>
<item_version>0</item_version>
<item>144</item>
</second>
</item>
<item>
<first>tmp_14_cast_fu_592</first>
<second>
<count>1</count>
<item_version>0</item_version>
<item>134</item>
</second>
</item>
<item>
<first>tmp_15_cast_fu_605</first>
<second>
<count>1</count>
<item_version>0</item_version>
<item>140</item>
</second>
</item>
<item>
<first>tmp_17_cast_fu_565</first>
<second>
<count>1</count>
<item_version>0</item_version>
<item>143</item>
</second>
</item>
<item>
<first>tmp_18_cast_fu_575</first>
<second>
<count>1</count>
<item_version>0</item_version>
<item>145</item>
</second>
</item>
<item>
<first>tmp_1_fu_436</first>
<second>
<count>1</count>
<item_version>0</item_version>
<item>52</item>
</second>
</item>
<item>
<first>tmp_2_cast_fu_596</first>
<second>
<count>1</count>
<item_version>0</item_version>
<item>138</item>
</second>
</item>
<item>
<first>tmp_2_fu_476</first>
<second>
<count>1</count>
<item_version>0</item_version>
<item>62</item>
</second>
</item>
<item>
<first>tmp_3_fu_458</first>
<second>
<count>1</count>
<item_version>0</item_version>
<item>66</item>
</second>
</item>
<item>
<first>tmp_3_mid2_cast_fu_462</first>
<second>
<count>1</count>
<item_version>0</item_version>
<item>56</item>
</second>
</item>
<item>
<first>tmp_3_mid2_fu_492</first>
<second>
<count>1</count>
<item_version>0</item_version>
<item>55</item>
</second>
</item>
<item>
<first>tmp_3_mid2_v_fu_450</first>
<second>
<count>1</count>
<item_version>0</item_version>
<item>54</item>
</second>
</item>
<item>
<first>tmp_4_fu_503</first>
<second>
<count>1</count>
<item_version>0</item_version>
<item>108</item>
</second>
</item>
<item>
<first>tmp_5_fu_533</first>
<second>
<count>1</count>
<item_version>0</item_version>
<item>129</item>
</second>
</item>
<item>
<first>tmp_7_fu_585</first>
<second>
<count>1</count>
<item_version>0</item_version>
<item>133</item>
</second>
</item>
<item>
<first>tmp_8_fu_465</first>
<second>
<count>1</count>
<item_version>0</item_version>
<item>60</item>
</second>
</item>
<item>
<first>tmp_9_cast_fu_472</first>
<second>
<count>1</count>
<item_version>0</item_version>
<item>61</item>
</second>
</item>
<item>
<first>tmp_9_fu_599</first>
<second>
<count>1</count>
<item_version>0</item_version>
<item>139</item>
</second>
</item>
<item>
<first>tmp_9_mid2_cast_fu_555</first>
<second>
<count>1</count>
<item_version>0</item_version>
<item>132</item>
</second>
</item>
<item>
<first>tmp_9_mid2_v_fu_547</first>
<second>
<count>1</count>
<item_version>0</item_version>
<item>131</item>
</second>
</item>
<item>
<first>tmp_fu_406</first>
<second>
<count>1</count>
<item_version>0</item_version>
<item>31</item>
</second>
</item>
</dp_fu_nodes_expression>
<dp_fu_nodes_module>
<count>1</count>
<item_version>0</item_version>
<item>
<first>grp_dct_1d_fu_363</first>
<second>
<count>4</count>
<item_version>0</item_version>
<item>37</item>
<item>37</item>
<item>114</item>
<item>114</item>
</second>
</item>
</dp_fu_nodes_module>
<dp_fu_nodes_io>
<count>0</count>
<item_version>0</item_version>
</dp_fu_nodes_io>
<return_ports>
<count>0</count>
<item_version>0</item_version>
</return_ports>
<dp_mem_port_nodes class_id="56" tracking_level="0" version="0">
<count>29</count>
<item_version>0</item_version>
<item class_id="57" tracking_level="0" version="0">
<first class_id="58" tracking_level="0" version="0">
<first>col_inbuf_0</first>
<second>0</second>
</first>
<second>
<count>1</count>
<item_version>0</item_version>
<item>94</item>
</second>
</item>
<item>
<first>
<first>col_inbuf_0</first>
<second>100</second>
</first>
<second>
<count>1</count>
<item_version>0</item_version>
<item>114</item>
</second>
</item>
<item>
<first>
<first>col_inbuf_1</first>
<second>0</second>
</first>
<second>
<count>1</count>
<item_version>0</item_version>
<item>90</item>
</second>
</item>
<item>
<first>
<first>col_inbuf_1</first>
<second>100</second>
</first>
<second>
<count>1</count>
<item_version>0</item_version>
<item>114</item>
</second>
</item>
<item>
<first>
<first>col_inbuf_2</first>
<second>0</second>
</first>
<second>
<count>1</count>
<item_version>0</item_version>
<item>86</item>
</second>
</item>
<item>
<first>
<first>col_inbuf_2</first>
<second>100</second>
</first>
<second>
<count>1</count>
<item_version>0</item_version>
<item>114</item>
</second>
</item>
<item>
<first>
<first>col_inbuf_3</first>
<second>0</second>
</first>
<second>
<count>1</count>
<item_version>0</item_version>
<item>82</item>
</second>
</item>
<item>
<first>
<first>col_inbuf_3</first>
<second>100</second>
</first>
<second>
<count>1</count>
<item_version>0</item_version>
<item>114</item>
</second>
</item>
<item>
<first>
<first>col_inbuf_4</first>
<second>0</second>
</first>
<second>
<count>1</count>
<item_version>0</item_version>
<item>78</item>
</second>
</item>
<item>
<first>
<first>col_inbuf_4</first>
<second>100</second>
</first>
<second>
<count>1</count>
<item_version>0</item_version>
<item>114</item>
</second>
</item>
<item>
<first>
<first>col_inbuf_5</first>
<second>0</second>
</first>
<second>
<count>1</count>
<item_version>0</item_version>
<item>74</item>
</second>
</item>
<item>
<first>
<first>col_inbuf_5</first>
<second>100</second>
</first>
<second>
<count>1</count>
<item_version>0</item_version>
<item>114</item>
</second>
</item>
<item>
<first>
<first>col_inbuf_6</first>
<second>0</second>
</first>
<second>
<count>1</count>
<item_version>0</item_version>
<item>70</item>
</second>
</item>
<item>
<first>
<first>col_inbuf_6</first>
<second>100</second>
</first>
<second>
<count>1</count>
<item_version>0</item_version>
<item>114</item>
</second>
</item>
<item>
<first>
<first>col_inbuf_7</first>
<second>0</second>
</first>
<second>
<count>1</count>
<item_version>0</item_version>
<item>98</item>
</second>
</item>
<item>
<first>
<first>col_inbuf_7</first>
<second>100</second>
</first>
<second>
<count>1</count>
<item_version>0</item_version>
<item>114</item>
</second>
</item>
<item>
<first>
<first>col_outbuf</first>
<second>0</second>
</first>
<second>
<count>2</count>
<item_version>0</item_version>
<item>147</item>
<item>147</item>
</second>
</item>
<item>
<first>
<first>col_outbuf</first>
<second>100</second>
</first>
<second>
<count>1</count>
<item_version>0</item_version>
<item>114</item>
</second>
</item>
<item>
<first>
<first>dct_coeff_table_0</first>
<second>100</second>
</first>
<second>
<count>2</count>
<item_version>0</item_version>
<item>37</item>
<item>114</item>
</second>
</item>
<item>
<first>
<first>dct_coeff_table_1</first>
<second>100</second>
</first>
<second>
<count>2</count>
<item_version>0</item_version>
<item>37</item>
<item>114</item>
</second>
</item>
<item>
<first>
<first>dct_coeff_table_2</first>
<second>100</second>
</first>
<second>
<count>2</count>
<item_version>0</item_version>
<item>37</item>
<item>114</item>
</second>
</item>
<item>
<first>
<first>dct_coeff_table_3</first>
<second>100</second>
</first>
<second>
<count>2</count>
<item_version>0</item_version>
<item>37</item>
<item>114</item>
</second>
</item>
<item>
<first>
<first>dct_coeff_table_4</first>
<second>100</second>
</first>
<second>
<count>2</count>
<item_version>0</item_version>
<item>37</item>
<item>114</item>
</second>
</item>
<item>
<first>
<first>dct_coeff_table_5</first>
<second>100</second>
</first>
<second>
<count>2</count>
<item_version>0</item_version>
<item>37</item>
<item>114</item>
</second>
</item>
<item>
<first>
<first>dct_coeff_table_6</first>
<second>100</second>
</first>
<second>
<count>2</count>
<item_version>0</item_version>
<item>37</item>
<item>114</item>
</second>
</item>
<item>
<first>
<first>dct_coeff_table_7</first>
<second>100</second>
</first>
<second>
<count>2</count>
<item_version>0</item_version>
<item>37</item>
<item>114</item>
</second>
</item>
<item>
<first>
<first>out_block</first>
<second>0</second>
</first>
<second>
<count>1</count>
<item_version>0</item_version>
<item>148</item>
</second>
</item>
<item>
<first>
<first>row_outbuf</first>
<second>0</second>
</first>
<second>
<count>2</count>
<item_version>0</item_version>
<item>65</item>
<item>65</item>
</second>
</item>
<item>
<first>
<first>row_outbuf</first>
<second>100</second>
</first>
<second>
<count>1</count>
<item_version>0</item_version>
<item>37</item>
</second>
</item>
</dp_mem_port_nodes>
<dp_reg_nodes>
<count>25</count>
<item_version>0</item_version>
<item>
<first>273</first>
<second>
<count>1</count>
<item_version>0</item_version>
<item>30</item>
</second>
</item>
<item>
<first>285</first>
<second>
<count>1</count>
<item_version>0</item_version>
<item>42</item>
</second>
</item>
<item>
<first>296</first>
<second>
<count>1</count>
<item_version>0</item_version>
<item>43</item>
</second>
</item>
<item>
<first>307</first>
<second>
<count>1</count>
<item_version>0</item_version>
<item>44</item>
</second>
</item>
<item>
<first>318</first>
<second>
<count>1</count>
<item_version>0</item_version>
<item>107</item>
</second>
</item>
<item>
<first>330</first>
<second>
<count>1</count>
<item_version>0</item_version>
<item>119</item>
</second>
</item>
<item>
<first>341</first>
<second>
<count>1</count>
<item_version>0</item_version>
<item>120</item>
</second>
</item>
<item>
<first>352</first>
<second>
<count>1</count>
<item_version>0</item_version>
<item>121</item>
</second>
</item>
<item>
<first>610</first>
<second>
<count>1</count>
<item_version>0</item_version>
<item>31</item>
</second>
</item>
<item>
<first>614</first>
<second>
<count>1</count>
<item_version>0</item_version>
<item>33</item>
</second>
</item>
<item>
<first>619</first>
<second>
<count>1</count>
<item_version>0</item_version>
<item>45</item>
</second>
</item>
<item>
<first>623</first>
<second>
<count>1</count>
<item_version>0</item_version>
<item>46</item>
</second>
</item>
<item>
<first>628</first>
<second>
<count>1</count>
<item_version>0</item_version>
<item>53</item>
</second>
</item>
<item>
<first>634</first>
<second>
<count>1</count>
<item_version>0</item_version>
<item>54</item>
</second>
</item>
<item>
<first>641</first>
<second>
<count>1</count>
<item_version>0</item_version>
<item>66</item>
</second>
</item>
<item>
<first>645</first>
<second>
<count>1</count>
<item_version>0</item_version>
<item>64</item>
</second>
</item>
<item>
<first>650</first>
<second>
<count>1</count>
<item_version>0</item_version>
<item>102</item>
</second>
</item>
<item>
<first>655</first>
<second>
<count>1</count>
<item_version>0</item_version>
<item>108</item>
</second>
</item>
<item>
<first>659</first>
<second>
<count>1</count>
<item_version>0</item_version>
<item>110</item>
</second>
</item>
<item>
<first>664</first>
<second>
<count>1</count>
<item_version>0</item_version>
<item>122</item>
</second>
</item>
<item>
<first>668</first>
<second>
<count>1</count>
<item_version>0</item_version>
<item>123</item>
</second>
</item>
<item>
<first>673</first>
<second>
<count>1</count>
<item_version>0</item_version>
<item>130</item>
</second>
</item>
<item>
<first>680</first>
<second>
<count>1</count>
<item_version>0</item_version>
<item>131</item>
</second>
</item>
<item>
<first>687</first>
<second>
<count>1</count>
<item_version>0</item_version>
<item>146</item>
</second>
</item>
<item>
<first>692</first>
<second>
<count>1</count>
<item_version>0</item_version>
<item>150</item>
</second>
</item>
</dp_reg_nodes>
<dp_regname_nodes>
<count>25</count>
<item_version>0</item_version>
<item>
<first>col_outbuf_addr_reg_687</first>
<second>
<count>1</count>
<item_version>0</item_version>
<item>146</item>
</second>
</item>
<item>
<first>exitcond_flatten1_reg_664</first>
<second>
<count>1</count>
<item_version>0</item_version>
<item>122</item>
</second>
</item>
<item>
<first>exitcond_flatten_reg_619</first>
<second>
<count>1</count>
<item_version>0</item_version>
<item>45</item>
</second>
</item>
<item>
<first>i_1_mid2_reg_628</first>
<second>
<count>1</count>
<item_version>0</item_version>
<item>53</item>
</second>
</item>
<item>
<first>i_1_reg_307</first>
<second>
<count>1</count>
<item_version>0</item_version>
<item>44</item>
</second>
</item>
<item>
<first>i_2_reg_318</first>
<second>
<count>1</count>
<item_version>0</item_version>
<item>107</item>
</second>
</item>
<item>
<first>i_3_mid2_reg_673</first>
<second>
<count>1</count>
<item_version>0</item_version>
<item>130</item>
</second>
</item>
<item>
<first>i_3_reg_352</first>
<second>
<count>1</count>
<item_version>0</item_version>
<item>121</item>
</second>
</item>
<item>
<first>i_4_reg_614</first>
<second>
<count>1</count>
<item_version>0</item_version>
<item>33</item>
</second>
</item>
<item>
<first>i_5_reg_659</first>
<second>
<count>1</count>
<item_version>0</item_version>
<item>110</item>
</second>
</item>
<item>
<first>i_6_reg_650</first>
<second>
<count>1</count>
<item_version>0</item_version>
<item>102</item>
</second>
</item>
<item>
<first>i_7_reg_692</first>
<second>
<count>1</count>
<item_version>0</item_version>
<item>150</item>
</second>
</item>
<item>
<first>i_reg_273</first>
<second>
<count>1</count>
<item_version>0</item_version>
<item>30</item>
</second>
</item>
<item>
<first>indvar_flatten1_reg_330</first>
<second>
<count>1</count>
<item_version>0</item_version>
<item>119</item>
</second>
</item>
<item>
<first>indvar_flatten_next1_reg_668</first>
<second>
<count>1</count>
<item_version>0</item_version>
<item>123</item>
</second>
</item>
<item>
<first>indvar_flatten_next_reg_623</first>
<second>
<count>1</count>
<item_version>0</item_version>
<item>46</item>
</second>
</item>
<item>
<first>indvar_flatten_reg_285</first>
<second>
<count>1</count>
<item_version>0</item_version>
<item>42</item>
</second>
</item>
<item>
<first>j_1_reg_341</first>
<second>
<count>1</count>
<item_version>0</item_version>
<item>120</item>
</second>
</item>
<item>
<first>j_reg_296</first>
<second>
<count>1</count>
<item_version>0</item_version>
<item>43</item>
</second>
</item>
<item>
<first>row_outbuf_addr_reg_645</first>
<second>
<count>1</count>
<item_version>0</item_version>
<item>64</item>
</second>
</item>
<item>
<first>tmp_3_mid2_v_reg_634</first>
<second>
<count>1</count>
<item_version>0</item_version>
<item>54</item>
</second>
</item>
<item>
<first>tmp_3_reg_641</first>
<second>
<count>1</count>
<item_version>0</item_version>
<item>66</item>
</second>
</item>
<item>
<first>tmp_4_reg_655</first>
<second>
<count>1</count>
<item_version>0</item_version>
<item>108</item>
</second>
</item>
<item>
<first>tmp_9_mid2_v_reg_680</first>
<second>
<count>1</count>
<item_version>0</item_version>
<item>131</item>
</second>
</item>
<item>
<first>tmp_reg_610</first>
<second>
<count>1</count>
<item_version>0</item_version>
<item>31</item>
</second>
</item>
</dp_regname_nodes>
<dp_reg_phi>
<count>8</count>
<item_version>0</item_version>
<item>
<first>273</first>
<second>
<count>1</count>
<item_version>0</item_version>
<item>30</item>
</second>
</item>
<item>
<first>285</first>
<second>
<count>1</count>
<item_version>0</item_version>
<item>42</item>
</second>
</item>
<item>
<first>296</first>
<second>
<count>1</count>
<item_version>0</item_version>
<item>43</item>
</second>
</item>
<item>
<first>307</first>
<second>
<count>1</count>
<item_version>0</item_version>
<item>44</item>
</second>
</item>
<item>
<first>318</first>
<second>
<count>1</count>
<item_version>0</item_version>
<item>107</item>
</second>
</item>
<item>
<first>330</first>
<second>
<count>1</count>
<item_version>0</item_version>
<item>119</item>
</second>
</item>
<item>
<first>341</first>
<second>
<count>1</count>
<item_version>0</item_version>
<item>120</item>
</second>
</item>
<item>
<first>352</first>
<second>
<count>1</count>
<item_version>0</item_version>
<item>121</item>
</second>
</item>
</dp_reg_phi>
<dp_regname_phi>
<count>8</count>
<item_version>0</item_version>
<item>
<first>i_1_reg_307</first>
<second>
<count>1</count>
<item_version>0</item_version>
<item>44</item>
</second>
</item>
<item>
<first>i_2_reg_318</first>
<second>
<count>1</count>
<item_version>0</item_version>
<item>107</item>
</second>
</item>
<item>
<first>i_3_reg_352</first>
<second>
<count>1</count>
<item_version>0</item_version>
<item>121</item>
</second>
</item>
<item>
<first>i_reg_273</first>
<second>
<count>1</count>
<item_version>0</item_version>
<item>30</item>
</second>
</item>
<item>
<first>indvar_flatten1_reg_330</first>
<second>
<count>1</count>
<item_version>0</item_version>
<item>119</item>
</second>
</item>
<item>
<first>indvar_flatten_reg_285</first>
<second>
<count>1</count>
<item_version>0</item_version>
<item>42</item>
</second>
</item>
<item>
<first>j_1_reg_341</first>
<second>
<count>1</count>
<item_version>0</item_version>
<item>120</item>
</second>
</item>
<item>
<first>j_reg_296</first>
<second>
<count>1</count>
<item_version>0</item_version>
<item>43</item>
</second>
</item>
</dp_regname_phi>
<dp_port_io_nodes class_id="59" tracking_level="0" version="0">
<count>1</count>
<item_version>0</item_version>
<item class_id="60" tracking_level="0" version="0">
<first>out_block(p0)</first>
<second>
<count>1</count>
<item_version>0</item_version>
<item>
<first>store</first>
<second>
<count>1</count>
<item_version>0</item_version>
<item>148</item>
</second>
</item>
</second>
</item>
</dp_port_io_nodes>
<port2core class_id="61" tracking_level="0" version="0">
<count>9</count>
<item_version>0</item_version>
<item class_id="62" tracking_level="0" version="0">
<first>1</first>
<second>RAM</second>
</item>
<item>
<first>2</first>
<second>RAM</second>
</item>
<item>
<first>3</first>
<second>RAM</second>
</item>
<item>
<first>4</first>
<second>RAM</second>
</item>
<item>
<first>5</first>
<second>RAM</second>
</item>
<item>
<first>6</first>
<second>RAM</second>
</item>
<item>
<first>7</first>
<second>RAM</second>
</item>
<item>
<first>8</first>
<second>RAM</second>
</item>
<item>
<first>9</first>
<second>RAM</second>
</item>
</port2core>
<node2core>
<count>10</count>
<item_version>0</item_version>
<item>
<first>18</first>
<second>RAM</second>
</item>
<item>
<first>19</first>
<second>RAM</second>
</item>
<item>
<first>20</first>
<second>RAM</second>
</item>
<item>
<first>21</first>
<second>RAM</second>
</item>
<item>
<first>22</first>
<second>RAM</second>
</item>
<item>
<first>23</first>
<second>RAM</second>
</item>
<item>
<first>24</first>
<second>RAM</second>
</item>
<item>
<first>25</first>
<second>RAM</second>
</item>
<item>
<first>26</first>
<second>RAM</second>
</item>
<item>
<first>27</first>
<second>RAM</second>
</item>
</node2core>
</syndb>
</boost_serialization>
| 29.683477 | 86 | 0.431184 |
3858e8407616b3aa3336c6d0dfae465dba559c4f | 6,845 | ads | Ada | ada_gui-gnoga-gui-document.ads | jrcarter/Ada_GUI | 65a829c55dec91fd48a0b72f88d76137768bf4fb | [
"BSD-3-Clause"
] | 19 | 2018-03-18T18:07:14.000Z | 2022-03-30T03:10:12.000Z | ada_gui-gnoga-gui-document.ads | jrcarter/Ada_GUI | 65a829c55dec91fd48a0b72f88d76137768bf4fb | [
"BSD-3-Clause"
] | 4 | 2021-08-23T12:52:06.000Z | 2022-03-31T10:48:43.000Z | ada_gui-gnoga-gui-document.ads | jrcarter/Ada_GUI | 65a829c55dec91fd48a0b72f88d76137768bf4fb | [
"BSD-3-Clause"
] | null | null | null | -- Ada_GUI implementation based on Gnoga. Adapted 2021
-- --
-- GNOGA - The GNU Omnificent GUI for Ada --
-- --
-- G N O G A . G U I . D O C U M E N T --
-- --
-- S p e c --
-- --
-- --
-- Copyright (C) 2014 David Botton --
-- --
-- This library is free software; you can redistribute it and/or modify --
-- it under terms of the GNU General Public License as published by the --
-- Free Software Foundation; either version 3, or (at your option) any --
-- later version. This library is distributed in the hope that it will be --
-- useful, but WITHOUT ANY WARRANTY; without even the implied warranty of --
-- MERCHANTABILITY or FITNESS FOR A PARTICULAR PURPOSE. --
-- --
-- As a special exception under Section 7 of GPL version 3, you are --
-- granted additional permissions described in the GCC Runtime Library --
-- Exception, version 3.1, as published by the Free Software Foundation. --
-- --
-- You should have received a copy of the GNU General Public License and --
-- a copy of the GCC Runtime Library Exception along with this program; --
-- see the files COPYING3 and COPYING.RUNTIME respectively. If not, see --
-- <http://www.gnu.org/licenses/>. --
-- --
-- As a special exception, if other files instantiate generics from this --
-- unit, or you link this unit with other files to produce an executable, --
-- this unit does not by itself cause the resulting executable to be --
-- covered by the GNU General Public License. This exception does not --
-- however invalidate any other reasons why the executable file might be --
-- covered by the GNU Public License. --
-- --
-- For more information please go to http://www.gnoga.com --
------------------------------------------------------------------------------
with Ada_GUI.Gnoga.Gui.Element;
package Ada_GUI.Gnoga.Gui.Document is
-------------------------------------------------------------------------
-- Document_Type
-------------------------------------------------------------------------
-- Document_Type is the class encapsulating the DOM's root document node
-- To use, access via Window_Type.Document
type Document_Type is new Gnoga.Gui.Base_Type with private;
type Document_Access is access all Document_Type;
type Pointer_To_Document_Class is access all Document_Type'Class;
Invalid_ID_Type : exception;
overriding procedure Attach
(Document : in out Document_Type;
Connection_ID : in Gnoga.Connection_ID;
ID : in String := "window";
ID_Type : in Gnoga.ID_Enumeration := Gnoga.Script);
-- Attach a Gnoga Document_Type to the document on Connection_ID
-- ID in this context does not mean as on other objects the ID of this
-- element, but rather the ID of the parent Window for the document.
-- ID_Type of DOM_ID will raise Invalid_ID_Type;
-------------------------------------------------------------------------
-- Document_Type - Properties
-------------------------------------------------------------------------
function Domain (Document : Document_Type) return String;
function Input_Encoding (Document : Document_Type) return String;
function Last_Modified (Document : Document_Type) return String;
function Referrer (Document : Document_Type) return String;
procedure Title (Document : in out Document_Type; Value : in String);
function Title (Document : Document_Type) return String;
function URL (Document : Document_Type) return String;
function Head_Element (Document : Document_Type)
return Gnoga.Gui.Element.Element_Access;
function Body_Element (Document : Document_Type)
return Gnoga.Gui.Element.Element_Access;
function Document_Element (Document : Document_Type)
return Gnoga.Gui.Element.Element_Access;
-- The document element is the root of the document, example <HTML>
-- in a text/html document. Using Document_Element.Outer_HTML will
-- return the entire document as per the current state in the browser.
type Ready_State_Type is (Uninitialized, Loading, Interactive, Complete);
function Ready_State (Document : Document_Type)
return Ready_State_Type;
-------------------------------------------------------------------------
-- Document_Type - Methods
-------------------------------------------------------------------------
procedure Load_CSS (Document : in out Document_Type; URL : in String);
-- Loads a CSS file in to document from URL
procedure Write (Document : in out Document_Type; Value : in String);
procedure Write_Line (Document : in out Document_Type; Value : in String);
-- Write Value (with new line if Write_Line) to the document.
-- Note that the first use of these procedures can erase elements already
-- inserted in to the Document.Body_Element. Therefore to use these
-- Write/Write_Line so that a text node is created before inserting any
-- elements into the document body.
-- In general, use View.Put_Line instead with in a view that is attached
-- to the window.
procedure Put_Line (Document : in out Document_Type; Value : in String);
-- Calls Write_Line with Value + "<br />"
-- Using Put_Line on Firefox will break the WebSocket connection
-- In general, use View.Put_Line instead with in a view that is attached
-- to the window.
private
type Document_Type is new Gnoga.Gui.Base_Type with
record
DOM_HTML : aliased Gnoga.Gui.Element.Element_Type;
DOM_Head : aliased Gnoga.Gui.Element.Element_Type;
DOM_Body : aliased Gnoga.Gui.Element.Element_Type;
end record;
end Ada_GUI.Gnoga.Gui.Document;
| 53.476563 | 78 | 0.534551 |
38c5ff9e6d7a8de0c4f15dea917501820b1ab36b | 1,497 | ads | Ada | enemy_bst.ads | Spohn/LegendOfZelba | f0bf1310647156ad5eab4977eaa3aea58c7f21cb | [
"MIT"
] | 2 | 2016-06-10T05:49:59.000Z | 2017-10-07T05:38:09.000Z | enemy_bst.ads | Spohn/LegendOfZelba | f0bf1310647156ad5eab4977eaa3aea58c7f21cb | [
"MIT"
] | null | null | null | enemy_bst.ads | Spohn/LegendOfZelba | f0bf1310647156ad5eab4977eaa3aea58c7f21cb | [
"MIT"
] | null | null | null | with NPC_PC; use NPC_PC;
package Enemy_BST is
-------------------------------
-- Name: Jon Spohn
-- David Rogina
-- Enemy Package Specification
-------------------------------
type EnemyTree is private;
--Connect enemy node to right of parent
procedure ConnectRight (T : IN OUT EnemyTree; E : EnemyClass);
--Connect enemy node to left of parent
procedure ConnectLeft (T : IN OUT EnemyTree; E : EnemyClass);
--Make Enemy
function MakeNode (E : EnemyClass) RETURN EnemyTree;
--Initialize enemy tree
procedure Initialize (T: IN OUT EnemyTree);
--Insert enemy node into tree
procedure Insert (T : IN OUT EnemyTree; E : EnemyClass);
--Search enemy tree for specific enemy coordinates
FUNCTION Search (T: EnemyTree; X : integer; Y: integer) RETURN EnemyClass;
function GetLeft(ET: EnemyTree) Return EnemyTree;
function GetRight(ET : EnemyTree) return EnemyTree;
function GetEnemy(ET : EnemyTree) return EnemyClass;
function IsNull(ET : EnemyTree) return integer;
--Find smallest leaf of parent node
FUNCTION FindSmallest (T : EnemyTree) RETURN EnemyTree;
--Delete enemy node
PROCEDURE Delete (T : IN OUT EnemyTree; K : IN EnemyClass);
private
TYPE BinaryTreeNode;
TYPE EnemyTree IS ACCESS BinaryTreeNode;
TYPE BinaryTreeNode IS RECORD
Enemy : EnemyClass;
Left : EnemyTree := NULL;
Right : EnemyTree := NULL;
END RECORD;
end Enemy_BST;
| 29.94 | 77 | 0.653975 |
13669a383f13df7591e504280ce10de260e7713e | 11,046 | ads | Ada | source/asis/asis-clauses.ads | faelys/gela-asis | 48a3bee90eda9f0c9d958b4e3c80a5a9b1c65253 | [
"BSD-3-Clause"
] | 4 | 2016-02-05T15:51:56.000Z | 2022-03-25T20:38:32.000Z | source/asis/asis-clauses.ads | faelys/gela-asis | 48a3bee90eda9f0c9d958b4e3c80a5a9b1c65253 | [
"BSD-3-Clause"
] | null | null | null | source/asis/asis-clauses.ads | faelys/gela-asis | 48a3bee90eda9f0c9d958b4e3c80a5a9b1c65253 | [
"BSD-3-Clause"
] | null | null | null | ------------------------------------------------------------------------------
-- G E L A A S I S --
-- ASIS implementation for Gela project, a portable Ada compiler --
-- http://gela.ada-ru.org --
-- - - - - - - - - - - - - - - - --
-- --
-- This specification is derived from the Ada Semantic Interface --
-- Specification Standard (ISO/IEC 15291) and ASIS 1999 Issues. --
-- --
-- The copyright notice and the license provisions that follow apply to the --
-- part following the private keyword. --
-- --
-- Read copyright and license at the end of this file --
------------------------------------------------------------------------------
-- $Revision: 209 $ $Date: 2013-11-30 21:03:24 +0200 (Сб., 30 нояб. 2013) $
------------------------------------------------------------------------------
------------------------------------------------------------------------------
-- 19 package Asis.Clauses
------------------------------------------------------------------------------
------------------------------------------------------------------------------
package Asis.Clauses is
pragma Preelaborate;
------------------------------------------------------------------------------
------------------------------------------------------------------------------
-- Asis.Clauses
--
-- This package encapsulates a set of queries that operate on A_Clause
-- elements.
--
-- |ER-----------------------------------------------------------------------
-- |ER A_Use_Package_Clause - 8.4
-- |ER A_Use_Type_Clause - 8.4
-- |ER A_With_Clause - 10.1.2
-- |CR
-- |CR Child elements returned by:
-- |CR function Clause_Names
-- |CR
------------------------------------------------------------------------------
------------------------------------------------------------------------------
-- 19.1 function Clause_Names
------------------------------------------------------------------------------
function Clause_Names (Clause : in Asis.Element)
return Asis.Name_List;
------------------------------------------------------------------------------
-- Clause - Specifies the with_clause or use_clause to query
--
-- Returns a list of the names that appear in the given clause.
-- The names in the list should be in their order of appearance in the
-- original clauses from the compilation text.
--
-- Results of this query may vary across ASIS implementations. Some
-- implementations normalize all clauses containing multiple names
-- into an equivalent sequence of corresponding single clauses.
-- Similarly, an implementation may keep a name only once even though that
-- name can appear more than once in a clause.
--
-- Appropriate Element_Kinds:
-- A_Use_Package_Clause
-- A_Use_Type_Clause
-- A_With_Clause
--
-- Returns Expression_Kinds:
-- An_Identifier
-- A_Selected_Component
-- An_Attribute_Reference
--
-- |ER-----------------------------------------------------------------------
-- |ER A_Representation_Clause - 13.1
-- |ER-----------------------------------------------------------------------
-- |ER An_Attribute_Definition_Clause - 13.3
-- |ER An_Enumeration_Representation_Clause - 13.4
-- |ER An_At_Clause - J.7
-- |CR
-- |CR Child elements returned by:
-- |CR function Representation_Clause_Name
-- |CR function Representation_Clause_Expression
--
------------------------------------------------------------------------------
-- 19.2 function Representation_Clause_Name
------------------------------------------------------------------------------
function Representation_Clause_Name (Clause : in Asis.Clause)
return Asis.Name;
------------------------------------------------------------------------------
-- Clause - Specifies the representation_clause to query
--
-- Returns the direct_name expression following the reserved word "for".
--
-- Appropriate Clause_Kinds:
-- A_Representation_Clause
-- A_Component_Clause
--
-- Returns Expression_Kinds:
-- An_Identifier
-- An_Attribute_Reference
--
------------------------------------------------------------------------------
-- 19.3 function Representation_Clause_Expression
------------------------------------------------------------------------------
function Representation_Clause_Expression
(Clause : in Asis.Representation_Clause)
return Asis.Expression;
------------------------------------------------------------------------------
-- Clause - Specifies the representation_clause to query
--
-- Returns the expression following the reserved word "use" or the reserved
-- words "use at".
--
-- Appropriate Representation_Clause_Kinds:
-- An_Attribute_Definition_Clause
-- An_Enumeration_Representation_Clause
-- An_At_Clause
--
-- Returns Element_Kinds:
-- An_Expression
--
-- |ER-----------------------------------------------------------------------
-- |ER A_Record_Representation_Clause - 13.5.1
-- |CR
-- |CR Child elements returned by:
-- |CR function Representation_Clause_Name
-- |CR function Mod_Clause_Expression
-- |CR function Component_Clauses
--
------------------------------------------------------------------------------
-- 19.4 function Mod_Clause_Expression
------------------------------------------------------------------------------
function Mod_Clause_Expression (Clause : in Asis.Representation_Clause)
return Asis.Expression;
------------------------------------------------------------------------------
-- Clause - Specifies the record representation clause to query
--
-- Returns the static_expression appearing after the reserved words "at mod".
--
-- Returns a Nil_Element if a mod_clause is not present.
--
-- Appropriate Representation_Clause_Kinds:
-- A_Record_Representation_Clause
--
-- Returns Element_Kinds:
-- Not_An_Element
-- An_Expression
--
------------------------------------------------------------------------------
-- 19.5 function Component_Clauses
------------------------------------------------------------------------------
function Component_Clauses (Clause : in Asis.Representation_Clause;
Include_Pragmas : in Boolean := False)
return Asis.Component_Clause_List;
------------------------------------------------------------------------------
-- Clause - Specifies the record representation clause to query
-- Include_Pragmas - Specifies whether pragmas are to be returned
--
-- Returns the component_clause and pragma elements from the
-- record_representation_clause, in their order of appearance.
--
-- Returns a Nil_Element_List if the record_representation_clause has no
-- component_clause or pragma elements.
--
-- Appropriate Representation_Clause_Kinds:
-- A_Record_Representation_Clause
--
-- Returns Element_Kinds:
-- A_Clause
-- A_Pragma
--
-- Returns Clause_Kinds:
-- A_Component_Clause
--
-- |ER-----------------------------------------------------------------------
-- |ER A_Component_Clause - 13.5.1
-- |CR
-- |CR Child elements returned by:
-- |CR function Representation_Clause_Name
-- |CR function Component_Clause_Position
-- |CR function Component_Clause_Range
--
------------------------------------------------------------------------------
-- 19.6 function Component_Clause_Position
------------------------------------------------------------------------------
function Component_Clause_Position (Clause : in Asis.Component_Clause)
return Asis.Expression;
------------------------------------------------------------------------------
-- Clause - Specifies the component_clause to query
--
-- Returns the position expression for the component_clause.
--
-- Appropriate Clause_Kinds:
-- A_Component_Clause
--
-- Returns Element_Kinds:
-- An_Expression
--
------------------------------------------------------------------------------
-- 19.7 function Component_Clause_Range
------------------------------------------------------------------------------
function Component_Clause_Range (Clause : in Asis.Component_Clause)
return Asis.Discrete_Range;
------------------------------------------------------------------------------
-- Clause - Specifies the component_clause to query
--
-- Returns the first_bit .. last_bit range for the component_clause.
--
-- Appropriate Clause_Kinds:
-- A_Component_Clause
--
-- Returns Discrete_Range_Kinds:
-- A_Discrete_Simple_Expression_Range
--
------------------------------------------------------------------------------
end Asis.Clauses;
------------------------------------------------------------------------------
-- Copyright (c) 2006-2013, Maxim Reznik
-- All rights reserved.
--
-- Redistribution and use in source and binary forms, with or without
-- modification, are permitted provided that the following conditions are met:
--
-- * Redistributions of source code must retain the above copyright notice,
-- this list of conditions and the following disclaimer.
-- * Redistributions in binary form must reproduce the above copyright
-- notice, this list of conditions and the following disclaimer in the
-- documentation and/or other materials provided with the distribution.
-- * Neither the name of the Maxim Reznik, IE nor the names of its
-- contributors may be used to endorse or promote products derived from
-- this software without specific prior written permission.
--
-- THIS SOFTWARE IS PROVIDED BY THE COPYRIGHT HOLDERS AND CONTRIBUTORS "AS IS"
-- AND ANY EXPRESS OR IMPLIED WARRANTIES, INCLUDING, BUT NOT LIMITED TO, THE
-- IMPLIED WARRANTIES OF MERCHANTABILITY AND FITNESS FOR A PARTICULAR PURPOSE
-- ARE DISCLAIMED. IN NO EVENT SHALL THE COPYRIGHT OWNER OR CONTRIBUTORS BE
-- LIABLE FOR ANY DIRECT, INDIRECT, INCIDENTAL, SPECIAL, EXEMPLARY, OR
-- CONSEQUENTIAL DAMAGES (INCLUDING, BUT NOT LIMITED TO, PROCUREMENT OF
-- SUBSTITUTE GOODS OR SERVICES; LOSS OF USE, DATA, OR PROFITS; OR BUSINESS
-- INTERRUPTION) HOWEVER CAUSED AND ON ANY THEORY OF LIABILITY, WHETHER IN
-- CONTRACT, STRICT LIABILITY, OR TORT (INCLUDING NEGLIGENCE OR OTHERWISE)
-- ARISING IN ANY WAY OUT OF THE USE OF THIS SOFTWARE, EVEN IF ADVISED OF THE
-- POSSIBILITY OF SUCH DAMAGE.
------------------------------------------------------------------------------
| 42.484615 | 79 | 0.484067 |
1e09450a5ae638243e10a9dd1caa9e9f20647e66 | 26,932 | adb | Ada | src/support_utils/support_utils-dictionary_form.adb | spr93/whitakers-words | 41fabacd04a3b62adfc6e77380e8755167e134c5 | [
"FTL"
] | null | null | null | src/support_utils/support_utils-dictionary_form.adb | spr93/whitakers-words | 41fabacd04a3b62adfc6e77380e8755167e134c5 | [
"FTL"
] | null | null | null | src/support_utils/support_utils-dictionary_form.adb | spr93/whitakers-words | 41fabacd04a3b62adfc6e77380e8755167e134c5 | [
"FTL"
] | null | null | null | -- WORDS, a Latin dictionary, by Colonel William Whitaker (USAF, Retired)
--
-- Copyright William A. Whitaker (1936–2010)
--
-- This is a free program, which means it is proper to copy it and pass
-- it on to your friends. Consider it a developmental item for which
-- there is no charge. However, just for form, it is Copyrighted
-- (c). Permission is hereby freely given for any and all use of program
-- and data. You can sell it as your own, but at least tell me.
--
-- This version is distributed without obligation, but the developer
-- would appreciate comments and suggestions.
--
-- All Parts of the WORDS system, source code and data files, are made freely
-- available to anyone who wishes to use them, for whatever purpose.
with Latin_Utils.Strings_Package; use Latin_Utils.Strings_Package;
with Latin_Utils.Inflections_Package; use Latin_Utils.Inflections_Package;
with Latin_Utils.Dictionary_Package; use Latin_Utils.Dictionary_Package;
function Support_Utils.Dictionary_Form (De : Dictionary_Entry) return String is
Null_Ox : constant String (1 .. 24) := (others => ' ');
Ox : array (1 .. 4) of String (1 .. 24) := (others => Null_Ox);
Form : String (1 .. 100) := (others => ' ');
Fst : constant array (Which_Type range 1 .. 5) of String (1 .. 3) :=
("1st", "2nd", "3rd", "4th", "5th");
Not_Found : exception;
function Add (Stem, Infl : String) return String is
begin
return Head (Trim (Stem) & Trim (Infl), 24);
end Add;
procedure Add_Up (Factor : String) is
begin
Form := Head (Trim (Form) & Trim (Factor), 100);
end Add_Up;
procedure Add_To (Factor : String) is
begin
Form := Head (Trim (Form) & Factor, 100);
end Add_To;
begin
--DICTIONARY_ENTRY_IO.PUT (DE);
-- So I can call with a NULL_DICTIONARY_ENTRY and not bomb
if De = Null_Dictionary_Entry then
return "";
end if;
if De.Part.Pofs = Prep then
return Trim (De.Stems (1)) & " " &
Part_Of_Speech_Type'Image (De.Part.Pofs) &
" " & Case_Type'Image (De.Part.Prep.Obj);
end if;
if De.Stems (2 .. 4) = (Null_Stem_Type, Null_Stem_Type, Null_Stem_Type) and
not (((De.Part.Pofs = N) and then (De.Part.N.Decl.Which = 9)) or
((De.Part.Pofs = Adj) and then
((De.Part.Adj.Decl.Which = 9) or
(De.Part.Adj.Co = Comp or De.Part.Adj.Co = Super))) or
((De.Part.Pofs = V) and then (De.Part.V.Con = (9, 8))) or
((De.Part.Pofs = V) and then (De.Part.V.Con = (9, 9))))
then
return Trim (De.Stems (1)) & " " &
Part_Of_Speech_Type'Image (De.Part.Pofs);
-- For UNIQUES, CONJ, INTERJ, . ..
end if;
if De.Part.Pofs = N then
case De.Part.N.Decl.Which is
-- First declension noun
when 1 =>
case De.Part.N.Decl.Var is
when 1 =>
Ox (1) := Add (De.Stems (1), "a");
Ox (2) := Add (De.Stems (2), "ae");
-- Greek nouns
when 6 =>
Ox (1) := Add (De.Stems (1), "e");
Ox (2) := Add (De.Stems (2), "es");
when 7 =>
Ox (1) := Add (De.Stems (1), "es");
Ox (2) := Add (De.Stems (2), "ae");
when 8 =>
Ox (1) := Add (De.Stems (1), "as");
Ox (2) := Add (De.Stems (2), "ae");
when others => null;
end case;
-- Second declension noun
when 2 =>
case De.Part.N.Decl.Var is
when 1 =>
Ox (1) := Add (De.Stems (1), "us");
Ox (2) := Add (De.Stems (2), "i");
when 2 =>
Ox (1) := Add (De.Stems (1), "um");
Ox (2) := Add (De.Stems (2), "i");
when 3 =>
Ox (1) := Add (De.Stems (1), "");
Ox (2) := Add (De.Stems (2), "i");
when 4 =>
if De.Part.N.Gender = N then
Ox (1) := Add (De.Stems (1), "um");
else
Ox (1) := Add (De.Stems (1), "us");
end if;
Ox (2) := Add (De.Stems (2), "(i)");
when 5 =>
Ox (1) := Add (De.Stems (1), "us");
Ox (2) := Add (De.Stems (2), "");
when 6 =>
Ox (1) := Add (De.Stems (1), "os");
Ox (2) := Add (De.Stems (2), "i");
when 7 =>
Ox (1) := Add (De.Stems (1), "");
Ox (2) := Add (De.Stems (2), "yos/i");
when 8 =>
Ox (1) := Add (De.Stems (1), "on");
Ox (2) := Add (De.Stems (2), "i");
when 9 =>
Ox (1) := Add (De.Stems (1), "us");
Ox (2) := Add (De.Stems (2), "i");
when others => null;
end case;
-- Third declension noun
when 3 =>
Ox (1) := Add (De.Stems (1), "");
if (De.Part.N.Decl.Var = 7) or
(De.Part.N.Decl.Var = 9)
then
Ox (2) := Add (De.Stems (2), "os/is");
else
Ox (2) := Add (De.Stems (2), "is");
end if;
-- Fourth declension noun
when 4 =>
case De.Part.N.Decl.Var is
when 1 =>
Ox (1) := Add (De.Stems (1), "us");
Ox (2) := Add (De.Stems (2), "us");
when 2 =>
Ox (1) := Add (De.Stems (1), "u");
Ox (2) := Add (De.Stems (2), "us");
when 3 =>
Ox (1) := Add (De.Stems (1), "us");
Ox (2) := Add (De.Stems (2), "u");
when 4 =>
Ox (1) := Add (De.Stems (1), "");
Ox (2) := Add (De.Stems (2), "u");
when others => null;
end case;
-- Fifth decelnsion noun
when 5 =>
Ox (1) := Add (De.Stems (1), "es");
Ox (2) := Add (De.Stems (2), "ei");
when 9 =>
case De.Part.N.Decl.Var is
when 8 =>
Ox (1) := Add (De.Stems (1), ".");
Ox (2) := Add (Null_Ox, "abb.");
when 9 =>
Ox (1) := Add (De.Stems (1), "");
Ox (2) := Add (Null_Ox, "undeclined");
when others => null;
end case;
when others =>
raise Not_Found;
end case;
elsif De.Part.Pofs = Pron then
case De.Part.Pron.Decl.Which is
-- Proximal demonstrative pronoun (hic, haec, hoc)
when 3 =>
Ox (1) := Add (De.Stems (1), "ic");
Ox (2) := Add (De.Stems (1), "aec");
if De.Part.Pron.Decl.Var = 1 then
Ox (3) := Add (De.Stems (1), "oc");
elsif De.Part.Pron.Decl.Var = 2 then
Ox (3) := Add (De.Stems (1), "uc");
end if;
when 4 =>
if De.Part.Pron.Decl.Var = 1 then
Ox (1) := Add (De.Stems (1), "s");
Ox (2) := Add (De.Stems (2), "a");
Ox (3) := Add (De.Stems (1), "d");
elsif De.Part.Pron.Decl.Var = 2 then
Ox (1) := Add (De.Stems (1), "dem");
Ox (2) := Add (De.Stems (2), "adem");
Ox (3) := Add (De.Stems (1), "dem");
end if;
-- Distal (ille, illa, illud) and medial (iste, ista, istud)
-- demonstrative pronoun
when 6 =>
Ox (1) := Add (De.Stems (1), "e");
Ox (2) := Add (De.Stems (1), "a");
if De.Part.Pron.Decl.Var = 1 then
Ox (3) := Add (De.Stems (1), "ud");
elsif De.Part.Pron.Decl.Var = 2 then
Ox (3) := Add (De.Stems (1), "um");
end if;
when 9 =>
if De.Part.Pron.Decl.Var = 8 then
Ox (1) := Add (De.Stems (1), ".");
Ox (2) := Add (Null_Ox, "abb.");
elsif De.Part.Pron.Decl.Var = 9 then
Ox (1) := Add (De.Stems (1), "");
Ox (2) := Add (Null_Ox, "undeclined");
end if;
when others =>
raise Not_Found;
end case;
elsif De.Part.Pofs = Adj then
--TEXT_IO.NEW_LINE;
--DICTIONARY_ENTRY_IO.PUT (DE);
--TEXT_IO.NEW_LINE;
case De.Part.Adj.Co is
when Comp =>
Ox (1) := Add (De.Stems (1), "or");
Ox (2) := Add (De.Stems (1), "or");
Ox (3) := Add (De.Stems (1), "us");
when Super =>
Ox (1) := Add (De.Stems (1), "mus");
Ox (2) := Add (De.Stems (1), "ma");
Ox (3) := Add (De.Stems (1), "mum");
when Pos =>
-- First declension adjective
if De.Part.Adj.Decl.Which = 1 then
case De.Part.Adj.Decl.Var is
when 1 =>
Ox (1) := Add (De.Stems (1), "us");
Ox (2) := Add (De.Stems (2), "a");
Ox (3) := Add (De.Stems (2), "um");
when 2 =>
Ox (1) := Add (De.Stems (1), "");
Ox (2) := Add (De.Stems (2), "a");
Ox (3) := Add (De.Stems (2), "um");
when 3 =>
Ox (1) := Add (De.Stems (1), "us");
Ox (2) := Add (De.Stems (2), "a");
Ox (3) := Add (De.Stems (2), "um (gen -ius)");
when 4 =>
Ox (1) := Add (De.Stems (1), "");
Ox (2) := Add (De.Stems (2), "a");
Ox (3) := Add (De.Stems (2), "um");
when 5 =>
Ox (1) := Add (De.Stems (1), "us");
Ox (2) := Add (De.Stems (2), "a");
Ox (3) := Add (De.Stems (2), "ud");
when others =>
raise Not_Found;
end case;
-- Second declension adjective
elsif De.Part.Adj.Decl.Which = 2 then
case De.Part.Adj.Decl.Var is
when 1 =>
Ox (1) := Add (Null_Ox, "-");
Ox (2) := Add (De.Stems (1), "e");
Ox (3) := Add (Null_Ox, "-");
when 2 =>
Ox (1) := Add (Null_Ox, "-");
Ox (2) := Add (Null_Ox, "a");
Ox (3) := Add (Null_Ox, "-");
when 3 =>
Ox (1) := Add (De.Stems (1), "es");
Ox (2) := Add (De.Stems (1), "es");
Ox (3) := Add (De.Stems (1), "es");
when 6 =>
Ox (1) := Add (De.Stems (1), "os");
Ox (2) := Add (De.Stems (1), "os");
Ox (3) := Add (Null_Ox, "-");
when 7 =>
Ox (1) := Add (De.Stems (1), "os");
Ox (2) := Add (Null_Ox, "-");
Ox (3) := Add (Null_Ox, "-");
when 8 =>
Ox (1) := Add (Null_Ox, "-");
Ox (2) := Add (Null_Ox, "-");
Ox (3) := Add (De.Stems (2), "on");
when others => null;
end case;
-- Third declension adjective
elsif De.Part.Adj.Decl.Which = 3 then
case De.Part.Adj.Decl.Var is
when 1 =>
Ox (1) := Add (De.Stems (1), "");
Ox (2) := Add (Null_Ox, "(gen.)");
Ox (3) := Add (De.Stems (2), "is");
when 2 =>
Ox (1) := Add (De.Stems (1), "is");
Ox (2) := Add (De.Stems (2), "is");
Ox (3) := Add (De.Stems (2), "e");
when 3 =>
Ox (1) := Add (De.Stems (1), "");
Ox (2) := Add (De.Stems (2), "is");
Ox (3) := Add (De.Stems (2), "e");
when 6 =>
Ox (1) := Add (De.Stems (1), "");
Ox (2) := Add (Null_Ox, "(gen.)");
Ox (3) := Add (De.Stems (2), "os");
when others => null;
end case;
elsif De.Part.Adj.Decl = (9, 8) then
Ox (1) := Add (De.Stems (1), ".");
Ox (2) := Add (Null_Ox, "abb.");
elsif De.Part.Adj.Decl = (9, 9) then
Ox (1) := Add (De.Stems (1), "");
Ox (2) := Add (Null_Ox, "undeclined");
else
raise Not_Found;
end if;
when X =>
case De.Part.Adj.Decl.Which is
when 1 =>
if De.Part.Adj.Decl.Var = 1 then
Ox (1) := Add (De.Stems (1), "us");
Ox (2) := Add (De.Stems (2), "a -um");
Ox (3) := Add (De.Stems (3), "or -or -us");
Ox (4) := Add (De.Stems (4), "mus -a -um");
elsif De.Part.Adj.Decl.Var = 2 then
Ox (1) := Add (De.Stems (1), "");
Ox (2) := Add (De.Stems (2), "a -um");
Ox (3) := Add (De.Stems (3), "or -or -us");
Ox (4) := Add (De.Stems (4), "mus -a -um");
end if;
when 3 =>
case De.Part.Adj.Decl.Var is
when 1 =>
Ox (1) := Add (De.Stems (1), "");
Ox (2) := Add (De.Stems (2), "is (gen.)");
Ox (3) := Add (De.Stems (3), "or -or -us");
Ox (4) := Add (De.Stems (4), "mus -a -um");
when 2 =>
Ox (1) := Add (De.Stems (1), "is");
Ox (2) := Add (De.Stems (2), "e");
Ox (3) := Add (De.Stems (3), "or -or -us");
Ox (4) := Add (De.Stems (4), "mus -a -um");
when 3 =>
Ox (1) := Add (De.Stems (1), "");
Ox (2) := Add (De.Stems (2), "is -e");
Ox (3) := Add (De.Stems (3), "or -or -us");
Ox (4) := Add (De.Stems (4), "mus -a -um");
when others => null;
end case;
when 9 =>
Ox (1) := Add (De.Stems (1), "");
Ox (2) := Add (Null_Ox, "undeclined");
Ox (3) := Add (De.Stems (3), "or -or -us");
Ox (4) := Add (De.Stems (4), "mus -a -um");
when others =>
raise Not_Found;
end case;
end case;
elsif (De.Part.Pofs = Adv) and then (De.Part.Adv.Co = X) then
Ox (1) := Add (De.Stems (1), "");
Ox (2) := Add (De.Stems (2), "");
Ox (3) := Add (De.Stems (3), "");
elsif De.Part.Pofs = V then
if De.Part.V.Kind = Dep then -- all DEP
Ox (3) := Add (Null_Ox, "DEP"); -- Flag for later use
Ox (4) := Add (De.Stems (4), "us sum");
case De.Part.V.Con.Which is
when 1 =>
Ox (1) := Add (De.Stems (1), "or");
Ox (2) := Add (De.Stems (2), "ari");
when 2 =>
Ox (1) := Add (De.Stems (1), "eor");
Ox (2) := Add (De.Stems (2), "eri");
when 3 =>
Ox (1) := Add (De.Stems (1), "or");
-- Would be wrong for 3 3, but no 3 3 DEP
if De.Part.V.Con.Var = 4 then
Ox (2) := Add (De.Stems (2), "iri");
else
Ox (2) := Add (De.Stems (2), "i");
end if;
when others =>
raise Not_Found;
end case; -- all DEP handled
elsif De.Part.V.Kind = Perfdef then -- all PERFDEF handled
Ox (1) := Add (De.Stems (3), "i");
Ox (2) := Add (De.Stems (3), "isse");
Ox (3) := Add (De.Stems (4), "us");
Ox (4) := Null_Ox; -- Flag for later use
elsif De.Part.V.Kind = Impers and then
((De.Stems (1)(1 .. 3) = "zzz") and -- Recognize as PERFDEF IMPERS
(De.Stems (2)(1 .. 3) = "zzz"))
then
Ox (1) := Add (De.Stems (3), "it");
Ox (2) := Add (De.Stems (3), "isse");
Ox (3) := Add (De.Stems (4), "us est");
-- OX (4) := ADD (NULL_OX, "PERFDEF");
else -- Not DEP/PERFDEF/IMPERS
if De.Part.V.Kind = Impers then
case De.Part.V.Con.Which is
when 1 =>
Ox (1) := Add (De.Stems (1), "at");
when 2 =>
Ox (1) := Add (De.Stems (1), "et");
when 3 =>
if De.Part.V.Con.Var = 2 then
Ox (1) := Add (De.Stems (1), "t");
else
if De.Stems (1)(Trim (De.Stems (1))'Last) = 'i' then
Ox (1) := Add (De.Stems (1), "t");
else
Ox (1) := Add (De.Stems (1), "it");
end if;
end if;
when 5 =>
if De.Part.V.Con.Var = 1 then
Ox (1) := Add (De.Stems (1), "est");
end if;
when 7 =>
if De.Part.V.Con.Var = 1 or
De.Part.V.Con.Var = 2
then
Ox (1) := Add (De.Stems (1), "t");
end if;
when others => null;
end case;
else
-- OX 1
if De.Part.V.Con.Which = 2 then
Ox (1) := Add (De.Stems (1), "eo");
elsif De.Part.V.Con.Which = 5 then
Ox (1) := Add (De.Stems (1), "um");
elsif De.Part.V.Con = (7, 2) then
Ox (1) := Add (De.Stems (1), "am");
else
Ox (1) := Add (De.Stems (1), "o");
end if;
end if;
-- OX 2
case De.Part.V.Con.Which is
when 1 =>
Ox (2) := Add (De.Stems (2), "are");
when 2 =>
Ox (2) := Add (De.Stems (2), "ere");
when 3 =>
case De.Part.V.Con.Var is
when 2 =>
Ox (2) := Add (De.Stems (2), "re");
when 3 =>
-- Special case for fio, fieri: it follows the usual
-- conjugation everywhere except for present infinitive
if Trim (De.Stems (2)) = "f" then
Ox (2) := Add (De.Stems (2), "ieri");
else
Ox (2) := Add (De.Stems (2), "eri");
end if;
when 4 =>
Ox (2) := Add (De.Stems (2), "ire");
when others =>
Ox (2) := Add (De.Stems (2), "ere");
end case;
-- elsif DE.PART.V.CON.WHICH = 4 then
-- OX (2) := ADD (DE.STEMS (2), "ire");
when 5 =>
if De.Part.V.Con.Var = 1 then
Ox (2) := Add (De.Stems (2), "esse");
elsif De.Part.V.Con.Var = 2 then
Ox (2) := Add (De.Stems (1), "e"); -- tricky, but it is 1
end if;
when 6 =>
if De.Part.V.Con.Var = 1 then
Ox (2) := Add (De.Stems (2), "re");
elsif De.Part.V.Con.Var = 2 then
Ox (2) := Add (De.Stems (2), "le");
end if;
when 7 =>
if De.Part.V.Con.Var = 3 then
Ox (2) := Add (De.Stems (2), "se");
end if;
when 8 =>
case De.Part.V.Con.Var is
when 1 =>
Ox (2) := Add (De.Stems (2), "are");
when 2 =>
Ox (2) := Add (De.Stems (2), "ere");
when 3 =>
Ox (2) := Add (De.Stems (2), "ere");
when 4 =>
Ox (2) := Add (De.Stems (2), "ire");
when others =>
Ox (2) := Add (De.Stems (2), "ere");
end case;
when 9 =>
if De.Part.V.Con.Var = 8 then
Ox (1) := Add (De.Stems (1), ".");
Ox (2) := Add (Null_Ox, "abb.");
elsif De.Part.V.Con.Var = 9 then
Ox (1) := Add (De.Stems (1), "");
Ox (2) := Add (Null_Ox, "undeclined");
end if;
when others => null;
end case; -- OX (2) handled
-- OX 3 & 4
if De.Part.V.Kind = Impers then
if Ox (3)(1 .. 7) /= "PERFDEF" then
Ox (3) := Add (De.Stems (3), "it");
end if;
Ox (4) := Add (De.Stems (4), "us est");
elsif De.Part.V.Kind = Semidep then -- Finalization correction
Ox (4) := Add (De.Stems (4), "us sum");
elsif De.Part.V.Con = (5, 1) then
Ox (3) := Add (De.Stems (3), "i");
Ox (4) := Add (De.Stems (4), "urus");
elsif De.Part.V.Con.Which = 8 then
Ox (3) := Add ("", "additional");
Ox (4) := Add ("", "forms");
elsif De.Part.V.Con.Which = 9 then
Ox (3) := Add (Null_Ox, "BLANK"); -- Flag for later use
Ox (4) := Add (Null_Ox, "BLANK"); -- Flag for later use
else
Ox (3) := Add (De.Stems (3), "i");
Ox (4) := Add (De.Stems (4), "us");
end if; -- OX (3 & 4) handled
end if; -- On V KIND
if De.Part.V.Con = (6, 1) then -- Finalization correction
Ox (3) := Add (Ox (3), " (ii)");
end if;
elsif (De.Part.Pofs = Num) and then (De.Part.Num.Sort = X) then
if De.Part.Num.Decl.Which = 1 then
case De.Part.Num.Decl.Var is
when 1 =>
Ox (1) := Add (De.Stems (1), "us -a -um");
Ox (2) := Add (De.Stems (2), "us -a -um");
Ox (3) := Add (De.Stems (3), "i -ae -a");
Ox (4) := Add (De.Stems (4), "");
when 2 =>
Ox (1) := Add (De.Stems (1), "o -ae o");
Ox (2) := Add (De.Stems (2), "us -a -um");
Ox (3) := Add (De.Stems (3), "i -ae -a");
Ox (4) := Add (De.Stems (4), "");
when 3 =>
Ox (1) := Add (De.Stems (1), "es -es -ia");
Ox (2) := Add (De.Stems (2), "us -a -um");
Ox (3) := Add (De.Stems (3), "i -ae -a");
Ox (4) := Add (De.Stems (4), "");
when 4 =>
Ox (1) := Add (De.Stems (1), "i -ae -a");
Ox (2) := Add (De.Stems (2), "us -a -um");
Ox (3) := Add (De.Stems (3), "i -ae -a");
Ox (4) := Add (De.Stems (4), "ie (n)s");
when others => null;
end case;
elsif De.Part.Num.Decl.Which = 2 then
Ox (1) := Add (De.Stems (1), "");
Ox (2) := Add (De.Stems (2), "us -a -um");
Ox (3) := Add (De.Stems (3), "i -ae -a");
Ox (4) := Add (De.Stems (4), "ie (n)s");
end if;
elsif (De.Part.Pofs = Num) and then (De.Part.Num.Sort = Card) then
if De.Part.Num.Decl.Which = 1 then
case De.Part.Num.Decl.Var is
when 1 =>
Ox (1) := Add (De.Stems (1), "us");
Ox (2) := Add (De.Stems (1), "a");
Ox (3) := Add (De.Stems (1), "um");
when 2 =>
Ox (1) := Add (De.Stems (1), "o");
Ox (2) := Add (De.Stems (1), "ae");
Ox (3) := Add (De.Stems (1), "o");
when 3 =>
Ox (1) := Add (De.Stems (1), "es");
Ox (2) := Add (De.Stems (1), "es");
Ox (3) := Add (De.Stems (1), "ia");
when 4 =>
Ox (1) := Add (De.Stems (1), "i");
Ox (2) := Add (De.Stems (1), "ae");
Ox (3) := Add (De.Stems (1), "a");
when others => null;
end case;
elsif De.Part.Num.Decl.Which = 2 then
Ox (1) := Add (De.Stems (1), "");
end if;
elsif (De.Part.Pofs = Num) and then (De.Part.Num.Sort = Ord) then
Ox (1) := Add (De.Stems (1), "us");
Ox (2) := Add (De.Stems (1), "a");
Ox (3) := Add (De.Stems (1), "um");
elsif (De.Part.Pofs = Num) and then (De.Part.Num.Sort = Dist) then
Ox (1) := Add (De.Stems (1), "i");
Ox (2) := Add (De.Stems (1), "ae");
Ox (3) := Add (De.Stems (1), "a");
else
Ox (1) := Add (De.Stems (1), "");
end if; -- On PART
--TEXT_IO.PUT_LINE (OX (1) & "+" & OX (2) & "+" & OX (3) & "+" & OX (4));
-- Now clean up and Output
-- Several flags have been set which modify OX's
if Ox (1)(1 .. 3) = "zzz" then
Add_Up (" - ");
elsif Ox (1) /= Null_Ox then
Add_Up (Trim (Ox (1)));
end if;
if Ox (2)(1 .. 3) = "zzz" then
Add_Up (", - ");
elsif Ox (2) /= Null_Ox then
Add_Up (", " & Trim (Ox (2)));
end if;
if Ox (3)(1 .. 3) = "zzz" then
Add_Up (", - ");
elsif Ox (3)(1 .. 3) = "DEP" then
null;
elsif Ox (3)(1 .. 7) = "PERFDEF" then
null;
elsif Ox (3)(1 .. 5) = "BLANK" then
null;
elsif Ox (3) /= Null_Ox then
Add_Up (", " & Trim (Ox (3)));
end if;
if Ox (4)(1 .. 3) = "zzz" then
Add_Up (", - ");
elsif Ox (4)(1 .. 5) = "BLANK" then
null;
elsif Ox (4) /= Null_Ox then
Add_Up (", " & Trim (Ox (4)));
end if;
Add_To (" " & Part_Of_Speech_Type'Image (De.Part.Pofs) & " ");
if De.Part.Pofs = N then
-- For DICTPAGE
if De.Part.N.Decl.Which in 1 .. 5 and
De.Part.N.Decl.Var in 1 .. 5
then
Add_To (" (" & Fst (De.Part.N.Decl.Which) & ")");
end if;
Add_To (" " & Gender_Type'Image (De.Part.N.Gender) & " ");
end if;
if De.Part.Pofs = V then
-- For DICTPAGE
if De.Part.V.Con.Which in 1 .. 3 then
if De.Part.V.Con.Var = 1 then
Add_To (" (" & Fst (De.Part.V.Con.Which) & ")");
elsif De.Part.V.Con = (3, 4) then
Add_To (" (" & Fst (4) & ")");
end if;
end if;
if De.Part.V.Kind in Gen .. Perfdef then
Add_To (" " & Verb_Kind_Type'Image (De.Part.V.Kind) & " ");
end if;
end if;
--TEXT_IO.PUT_LINE (">>>>" & TRIM (FORM));
return Trim (Form);
exception
when Not_Found =>
return "";
when others =>
return "";
end Support_Utils.Dictionary_Form;
| 37.825843 | 79 | 0.381665 |
ad89160f1cc3c53612021adec1884a4b35578327 | 1,081 | ads | Ada | source/regions/regions-contexts-environments.ads | reznikmm/declarative-regions | 2e2072aaf5163b49891b24873d179ea61249dd70 | [
"MIT"
] | null | null | null | source/regions/regions-contexts-environments.ads | reznikmm/declarative-regions | 2e2072aaf5163b49891b24873d179ea61249dd70 | [
"MIT"
] | null | null | null | source/regions/regions-contexts-environments.ads | reznikmm/declarative-regions | 2e2072aaf5163b49891b24873d179ea61249dd70 | [
"MIT"
] | null | null | null | -- SPDX-FileCopyrightText: 2022 Max Reznik <[email protected]>
--
-- SPDX-License-Identifier: MIT
-------------------------------------------------------------
private with Ada.Finalization;
private with Regions.Shared_Lists;
limited private with Regions.Contexts.Environments.Nodes;
package Regions.Contexts.Environments is
pragma Preelaborate;
type Environment is tagged private;
-- function Use_Visible
-- function Directly_Visible
function Nested_Regions (Self : Environment'Class)
return Regions.Entity_Iterator_Interfaces.Forward_Iterator'Class;
private
type Environment_Node_Access is
access all Regions.Contexts.Environments.Nodes.Environment_Node'Class;
type Environment is new Ada.Finalization.Controlled with record
Data : Environment_Node_Access;
end record;
overriding procedure Adjust (Self : in out Environment);
overriding procedure Finalize (Self : in out Environment);
package Selected_Entity_Name_Lists is
new Regions.Shared_Lists (Selected_Entity_Name);
end Regions.Contexts.Environments;
| 27.717949 | 75 | 0.73728 |
04a1752a0da1803bad512cadb9d4469302198330 | 6,213 | adb | Ada | support/MinGW/lib/gcc/mingw32/9.2.0/adainclude/a-dynpri.adb | orb-zhuchen/Orb | 6da2404b949ac28bde786e08bf4debe4a27cd3a0 | [
"CNRI-Python-GPL-Compatible",
"MIT"
] | null | null | null | support/MinGW/lib/gcc/mingw32/9.2.0/adainclude/a-dynpri.adb | orb-zhuchen/Orb | 6da2404b949ac28bde786e08bf4debe4a27cd3a0 | [
"CNRI-Python-GPL-Compatible",
"MIT"
] | null | null | null | support/MinGW/lib/gcc/mingw32/9.2.0/adainclude/a-dynpri.adb | orb-zhuchen/Orb | 6da2404b949ac28bde786e08bf4debe4a27cd3a0 | [
"CNRI-Python-GPL-Compatible",
"MIT"
] | null | null | null | ------------------------------------------------------------------------------
-- --
-- GNAT RUN-TIME LIBRARY (GNARL) COMPONENTS --
-- --
-- A D A . D Y N A M I C _ P R I O R I T I E S --
-- --
-- B o d y --
-- --
-- Copyright (C) 1992-2019, Free Software Foundation, Inc. --
-- --
-- GNARL is free software; you can redistribute it and/or modify it under --
-- terms of the GNU General Public License as published by the Free Soft- --
-- ware Foundation; either version 3, or (at your option) any later ver- --
-- sion. GNAT is distributed in the hope that it will be useful, but WITH- --
-- OUT ANY WARRANTY; without even the implied warranty of MERCHANTABILITY --
-- or FITNESS FOR A PARTICULAR PURPOSE. --
-- --
-- As a special exception under Section 7 of GPL version 3, you are granted --
-- additional permissions described in the GCC Runtime Library Exception, --
-- version 3.1, as published by the Free Software Foundation. --
-- --
-- You should have received a copy of the GNU General Public License and --
-- a copy of the GCC Runtime Library Exception along with this program; --
-- see the files COPYING3 and COPYING.RUNTIME respectively. If not, see --
-- <http://www.gnu.org/licenses/>. --
-- --
-- GNARL was developed by the GNARL team at Florida State University. --
-- Extensive contributions were provided by Ada Core Technologies, Inc. --
-- --
------------------------------------------------------------------------------
with System.Task_Primitives.Operations;
with System.Tasking;
with System.Parameters;
with System.Soft_Links;
with Ada.Unchecked_Conversion;
package body Ada.Dynamic_Priorities is
package STPO renames System.Task_Primitives.Operations;
package SSL renames System.Soft_Links;
use System.Parameters;
use System.Tasking;
function Convert_Ids is new
Ada.Unchecked_Conversion
(Task_Identification.Task_Id, System.Tasking.Task_Id);
------------------
-- Get_Priority --
------------------
-- Inquire base priority of a task
function Get_Priority
(T : Ada.Task_Identification.Task_Id :=
Ada.Task_Identification.Current_Task) return System.Any_Priority
is
Target : constant Task_Id := Convert_Ids (T);
Error_Message : constant String := "Trying to get the priority of a ";
begin
if Target = Convert_Ids (Ada.Task_Identification.Null_Task_Id) then
raise Program_Error with Error_Message & "null task";
end if;
if Task_Identification.Is_Terminated (T) then
raise Tasking_Error with Error_Message & "terminated task";
end if;
return Target.Common.Base_Priority;
end Get_Priority;
------------------
-- Set_Priority --
------------------
-- Change base priority of a task dynamically
procedure Set_Priority
(Priority : System.Any_Priority;
T : Ada.Task_Identification.Task_Id :=
Ada.Task_Identification.Current_Task)
is
Target : constant Task_Id := Convert_Ids (T);
Error_Message : constant String := "Trying to set the priority of a ";
Yield_Needed : Boolean;
begin
if Target = Convert_Ids (Ada.Task_Identification.Null_Task_Id) then
raise Program_Error with Error_Message & "null task";
end if;
-- Setting the priority of an already-terminated task doesn't do
-- anything (see RM-D.5.1(7)). Note that Get_Priority is different in
-- this regard.
if Task_Identification.Is_Terminated (T) then
return;
end if;
SSL.Abort_Defer.all;
if Single_Lock then
STPO.Lock_RTS;
end if;
STPO.Write_Lock (Target);
Target.Common.Base_Priority := Priority;
if Target.Common.Call /= null
and then
Target.Common.Call.Acceptor_Prev_Priority /= Priority_Not_Boosted
then
-- Target is within a rendezvous, so ensure the correct priority
-- will be reset when finishing the rendezvous, and only change the
-- priority immediately if the new priority is greater than the
-- current (inherited) priority.
Target.Common.Call.Acceptor_Prev_Priority := Priority;
if Priority >= Target.Common.Current_Priority then
Yield_Needed := True;
STPO.Set_Priority (Target, Priority);
else
Yield_Needed := False;
end if;
else
Yield_Needed := True;
STPO.Set_Priority (Target, Priority);
if Target.Common.State = Entry_Caller_Sleep then
Target.Pending_Priority_Change := True;
STPO.Wakeup (Target, Target.Common.State);
end if;
end if;
STPO.Unlock (Target);
if Single_Lock then
STPO.Unlock_RTS;
end if;
if STPO.Self = Target and then Yield_Needed then
-- Yield is needed to enforce FIFO task dispatching
-- LL Set_Priority is made while holding the RTS lock so that it is
-- inheriting high priority until it release all the RTS locks.
-- If this is used in a system where Ceiling Locking is not enforced
-- we may end up getting two Yield effects.
STPO.Yield;
end if;
SSL.Abort_Undefer.all;
end Set_Priority;
end Ada.Dynamic_Priorities;
| 37.654545 | 78 | 0.539997 |
38c33771444fc156feb5f6201aed1019de5fec86 | 38,414 | adb | Ada | Vivado_HLS_Tutorial/Interface_Synthesis/lab2/adders_io_prj/solution1/.autopilot/db/adders_io.adb | williambong/Vivado | 68efafbc44b65c0bb047dbafc0ff7f1b56ee36bb | [
"MIT"
] | null | null | null | Vivado_HLS_Tutorial/Interface_Synthesis/lab2/adders_io_prj/solution1/.autopilot/db/adders_io.adb | williambong/Vivado | 68efafbc44b65c0bb047dbafc0ff7f1b56ee36bb | [
"MIT"
] | null | null | null | Vivado_HLS_Tutorial/Interface_Synthesis/lab2/adders_io_prj/solution1/.autopilot/db/adders_io.adb | williambong/Vivado | 68efafbc44b65c0bb047dbafc0ff7f1b56ee36bb | [
"MIT"
] | null | null | null | <?xml version="1.0" encoding="UTF-8" standalone="yes" ?>
<!DOCTYPE boost_serialization>
<boost_serialization signature="serialization::archive" version="11">
<syndb class_id="0" tracking_level="0" version="0">
<userIPLatency>-1</userIPLatency>
<userIPName/>
<cdfg class_id="1" tracking_level="1" version="0" object_id="_0">
<name>adders_io</name>
<ret_bitwidth>0</ret_bitwidth>
<ports class_id="2" tracking_level="0" version="0">
<count>3</count>
<item_version>0</item_version>
<item class_id="3" tracking_level="1" version="0" object_id="_1">
<Value class_id="4" tracking_level="0" version="0">
<Obj class_id="5" tracking_level="0" version="0">
<type>1</type>
<id>1</id>
<name>in1</name>
<fileName/>
<fileDirectory/>
<lineNumber>0</lineNumber>
<contextFuncName/>
<inlineStackInfo class_id="6" tracking_level="0" version="0">
<count>0</count>
<item_version>0</item_version>
</inlineStackInfo>
<originalName>in1</originalName>
<rtlName/>
<coreName/>
</Obj>
<bitwidth>32</bitwidth>
</Value>
<direction>0</direction>
<if_type>0</if_type>
<array_size>0</array_size>
<bit_vecs class_id="7" tracking_level="0" version="0">
<count>0</count>
<item_version>0</item_version>
</bit_vecs>
</item>
<item class_id_reference="3" object_id="_2">
<Value>
<Obj>
<type>1</type>
<id>2</id>
<name>in2</name>
<fileName/>
<fileDirectory/>
<lineNumber>0</lineNumber>
<contextFuncName/>
<inlineStackInfo>
<count>0</count>
<item_version>0</item_version>
</inlineStackInfo>
<originalName>in2</originalName>
<rtlName/>
<coreName/>
</Obj>
<bitwidth>32</bitwidth>
</Value>
<direction>0</direction>
<if_type>0</if_type>
<array_size>0</array_size>
<bit_vecs>
<count>0</count>
<item_version>0</item_version>
</bit_vecs>
</item>
<item class_id_reference="3" object_id="_3">
<Value>
<Obj>
<type>1</type>
<id>3</id>
<name>in_out1</name>
<fileName/>
<fileDirectory/>
<lineNumber>0</lineNumber>
<contextFuncName/>
<inlineStackInfo>
<count>0</count>
<item_version>0</item_version>
</inlineStackInfo>
<originalName>in_out1</originalName>
<rtlName/>
<coreName/>
</Obj>
<bitwidth>32</bitwidth>
</Value>
<direction>2</direction>
<if_type>0</if_type>
<array_size>0</array_size>
<bit_vecs>
<count>0</count>
<item_version>0</item_version>
</bit_vecs>
</item>
</ports>
<nodes class_id="8" tracking_level="0" version="0">
<count>7</count>
<item_version>0</item_version>
<item class_id="9" tracking_level="1" version="0" object_id="_4">
<Value>
<Obj>
<type>0</type>
<id>8</id>
<name>in2_read</name>
<fileName/>
<fileDirectory/>
<lineNumber>0</lineNumber>
<contextFuncName/>
<inlineStackInfo>
<count>0</count>
<item_version>0</item_version>
</inlineStackInfo>
<originalName>in2</originalName>
<rtlName/>
<coreName/>
</Obj>
<bitwidth>32</bitwidth>
</Value>
<oprand_edges>
<count>2</count>
<item_version>0</item_version>
<item>20</item>
<item>21</item>
</oprand_edges>
<opcode>read</opcode>
</item>
<item class_id_reference="9" object_id="_5">
<Value>
<Obj>
<type>0</type>
<id>9</id>
<name>in1_read</name>
<fileName/>
<fileDirectory/>
<lineNumber>0</lineNumber>
<contextFuncName/>
<inlineStackInfo>
<count>0</count>
<item_version>0</item_version>
</inlineStackInfo>
<originalName>in1</originalName>
<rtlName/>
<coreName/>
</Obj>
<bitwidth>32</bitwidth>
</Value>
<oprand_edges>
<count>2</count>
<item_version>0</item_version>
<item>23</item>
<item>24</item>
</oprand_edges>
<opcode>read</opcode>
</item>
<item class_id_reference="9" object_id="_6">
<Value>
<Obj>
<type>0</type>
<id>13</id>
<name>in_out1_read</name>
<fileName>adders_io.c</fileName>
<fileDirectory>..</fileDirectory>
<lineNumber>50</lineNumber>
<contextFuncName>adders_io</contextFuncName>
<inlineStackInfo>
<count>1</count>
<item_version>0</item_version>
<item class_id="11" tracking_level="0" version="0">
<first>d:/opt/source/Vivado/Vivado_HLS_Tutorial/Interface_Synthesis/lab2</first>
<second class_id="12" tracking_level="0" version="0">
<count>1</count>
<item_version>0</item_version>
<item class_id="13" tracking_level="0" version="0">
<first class_id="14" tracking_level="0" version="0">
<first>adders_io.c</first>
<second>adders_io</second>
</first>
<second>50</second>
</item>
</second>
</item>
</inlineStackInfo>
<originalName/>
<rtlName/>
<coreName/>
</Obj>
<bitwidth>32</bitwidth>
</Value>
<oprand_edges>
<count>2</count>
<item_version>0</item_version>
<item>26</item>
<item>27</item>
</oprand_edges>
<opcode>read</opcode>
</item>
<item class_id_reference="9" object_id="_7">
<Value>
<Obj>
<type>0</type>
<id>14</id>
<name>tmp1</name>
<fileName>adders_io.c</fileName>
<fileDirectory>..</fileDirectory>
<lineNumber>50</lineNumber>
<contextFuncName>adders_io</contextFuncName>
<inlineStackInfo>
<count>1</count>
<item_version>0</item_version>
<item>
<first>d:/opt/source/Vivado/Vivado_HLS_Tutorial/Interface_Synthesis/lab2</first>
<second>
<count>1</count>
<item_version>0</item_version>
<item>
<first>
<first>adders_io.c</first>
<second>adders_io</second>
</first>
<second>50</second>
</item>
</second>
</item>
</inlineStackInfo>
<originalName/>
<rtlName>tmp1_fu_57_p2</rtlName>
<coreName/>
</Obj>
<bitwidth>32</bitwidth>
</Value>
<oprand_edges>
<count>2</count>
<item_version>0</item_version>
<item>28</item>
<item>29</item>
</oprand_edges>
<opcode>add</opcode>
</item>
<item class_id_reference="9" object_id="_8">
<Value>
<Obj>
<type>0</type>
<id>15</id>
<name>tmp_1</name>
<fileName>adders_io.c</fileName>
<fileDirectory>..</fileDirectory>
<lineNumber>50</lineNumber>
<contextFuncName>adders_io</contextFuncName>
<inlineStackInfo>
<count>1</count>
<item_version>0</item_version>
<item>
<first>d:/opt/source/Vivado/Vivado_HLS_Tutorial/Interface_Synthesis/lab2</first>
<second>
<count>1</count>
<item_version>0</item_version>
<item>
<first>
<first>adders_io.c</first>
<second>adders_io</second>
</first>
<second>50</second>
</item>
</second>
</item>
</inlineStackInfo>
<originalName/>
<rtlName>in_out1_o</rtlName>
<coreName/>
</Obj>
<bitwidth>32</bitwidth>
</Value>
<oprand_edges>
<count>2</count>
<item_version>0</item_version>
<item>30</item>
<item>31</item>
</oprand_edges>
<opcode>add</opcode>
</item>
<item class_id_reference="9" object_id="_9">
<Value>
<Obj>
<type>0</type>
<id>16</id>
<name/>
<fileName>adders_io.c</fileName>
<fileDirectory>..</fileDirectory>
<lineNumber>50</lineNumber>
<contextFuncName>adders_io</contextFuncName>
<inlineStackInfo>
<count>1</count>
<item_version>0</item_version>
<item>
<first>d:/opt/source/Vivado/Vivado_HLS_Tutorial/Interface_Synthesis/lab2</first>
<second>
<count>1</count>
<item_version>0</item_version>
<item>
<first>
<first>adders_io.c</first>
<second>adders_io</second>
</first>
<second>50</second>
</item>
</second>
</item>
</inlineStackInfo>
<originalName/>
<rtlName/>
<coreName/>
</Obj>
<bitwidth>0</bitwidth>
</Value>
<oprand_edges>
<count>4</count>
<item_version>0</item_version>
<item>33</item>
<item>34</item>
<item>35</item>
<item>83</item>
</oprand_edges>
<opcode>write</opcode>
</item>
<item class_id_reference="9" object_id="_10">
<Value>
<Obj>
<type>0</type>
<id>17</id>
<name/>
<fileName>adders_io.c</fileName>
<fileDirectory>..</fileDirectory>
<lineNumber>53</lineNumber>
<contextFuncName>adders_io</contextFuncName>
<inlineStackInfo>
<count>1</count>
<item_version>0</item_version>
<item>
<first>d:/opt/source/Vivado/Vivado_HLS_Tutorial/Interface_Synthesis/lab2</first>
<second>
<count>1</count>
<item_version>0</item_version>
<item>
<first>
<first>adders_io.c</first>
<second>adders_io</second>
</first>
<second>53</second>
</item>
</second>
</item>
</inlineStackInfo>
<originalName/>
<rtlName/>
<coreName/>
</Obj>
<bitwidth>0</bitwidth>
</Value>
<oprand_edges>
<count>0</count>
<item_version>0</item_version>
</oprand_edges>
<opcode>ret</opcode>
</item>
</nodes>
<consts class_id="15" tracking_level="0" version="0">
<count>0</count>
<item_version>0</item_version>
</consts>
<blocks class_id="16" tracking_level="0" version="0">
<count>1</count>
<item_version>0</item_version>
<item class_id="17" tracking_level="1" version="0" object_id="_11">
<Obj>
<type>3</type>
<id>18</id>
<name>adders_io</name>
<fileName/>
<fileDirectory/>
<lineNumber>0</lineNumber>
<contextFuncName/>
<inlineStackInfo>
<count>0</count>
<item_version>0</item_version>
</inlineStackInfo>
<originalName/>
<rtlName/>
<coreName/>
</Obj>
<node_objs>
<count>7</count>
<item_version>0</item_version>
<item>8</item>
<item>9</item>
<item>13</item>
<item>14</item>
<item>15</item>
<item>16</item>
<item>17</item>
</node_objs>
</item>
</blocks>
<edges class_id="18" tracking_level="0" version="0">
<count>10</count>
<item_version>0</item_version>
<item class_id="19" tracking_level="1" version="0" object_id="_12">
<id>21</id>
<edge_type>1</edge_type>
<source_obj>2</source_obj>
<sink_obj>8</sink_obj>
</item>
<item class_id_reference="19" object_id="_13">
<id>24</id>
<edge_type>1</edge_type>
<source_obj>1</source_obj>
<sink_obj>9</sink_obj>
</item>
<item class_id_reference="19" object_id="_14">
<id>27</id>
<edge_type>1</edge_type>
<source_obj>3</source_obj>
<sink_obj>13</sink_obj>
</item>
<item class_id_reference="19" object_id="_15">
<id>28</id>
<edge_type>1</edge_type>
<source_obj>8</source_obj>
<sink_obj>14</sink_obj>
</item>
<item class_id_reference="19" object_id="_16">
<id>29</id>
<edge_type>1</edge_type>
<source_obj>9</source_obj>
<sink_obj>14</sink_obj>
</item>
<item class_id_reference="19" object_id="_17">
<id>30</id>
<edge_type>1</edge_type>
<source_obj>14</source_obj>
<sink_obj>15</sink_obj>
</item>
<item class_id_reference="19" object_id="_18">
<id>31</id>
<edge_type>1</edge_type>
<source_obj>13</source_obj>
<sink_obj>15</sink_obj>
</item>
<item class_id_reference="19" object_id="_19">
<id>34</id>
<edge_type>1</edge_type>
<source_obj>3</source_obj>
<sink_obj>16</sink_obj>
</item>
<item class_id_reference="19" object_id="_20">
<id>35</id>
<edge_type>1</edge_type>
<source_obj>15</source_obj>
<sink_obj>16</sink_obj>
</item>
<item class_id_reference="19" object_id="_21">
<id>83</id>
<edge_type>4</edge_type>
<source_obj>13</source_obj>
<sink_obj>16</sink_obj>
</item>
</edges>
</cdfg>
<cdfg_regions class_id="20" tracking_level="0" version="0">
<count>1</count>
<item_version>0</item_version>
<item class_id="21" tracking_level="1" version="0" object_id="_22">
<mId>1</mId>
<mTag>adders_io</mTag>
<mType>0</mType>
<sub_regions>
<count>0</count>
<item_version>0</item_version>
</sub_regions>
<basic_blocks>
<count>1</count>
<item_version>0</item_version>
<item>18</item>
</basic_blocks>
<mII>-1</mII>
<mDepth>-1</mDepth>
<mMinTripCount>-1</mMinTripCount>
<mMaxTripCount>-1</mMaxTripCount>
<mMinLatency>1</mMinLatency>
<mMaxLatency>-1</mMaxLatency>
<mIsDfPipe>0</mIsDfPipe>
<mDfPipe class_id="-1"/>
</item>
</cdfg_regions>
<fsm class_id="23" tracking_level="1" version="0" object_id="_23">
<states class_id="24" tracking_level="0" version="0">
<count>2</count>
<item_version>0</item_version>
<item class_id="25" tracking_level="1" version="0" object_id="_24">
<id>1</id>
<operations class_id="26" tracking_level="0" version="0">
<count>4</count>
<item_version>0</item_version>
<item class_id="27" tracking_level="1" version="0" object_id="_25">
<id>8</id>
<stage>1</stage>
<latency>1</latency>
</item>
<item class_id_reference="27" object_id="_26">
<id>9</id>
<stage>1</stage>
<latency>1</latency>
</item>
<item class_id_reference="27" object_id="_27">
<id>13</id>
<stage>1</stage>
<latency>1</latency>
</item>
<item class_id_reference="27" object_id="_28">
<id>14</id>
<stage>1</stage>
<latency>1</latency>
</item>
</operations>
</item>
<item class_id_reference="25" object_id="_29">
<id>2</id>
<operations>
<count>10</count>
<item_version>0</item_version>
<item class_id_reference="27" object_id="_30">
<id>4</id>
<stage>1</stage>
<latency>1</latency>
</item>
<item class_id_reference="27" object_id="_31">
<id>5</id>
<stage>1</stage>
<latency>1</latency>
</item>
<item class_id_reference="27" object_id="_32">
<id>6</id>
<stage>1</stage>
<latency>1</latency>
</item>
<item class_id_reference="27" object_id="_33">
<id>7</id>
<stage>1</stage>
<latency>1</latency>
</item>
<item class_id_reference="27" object_id="_34">
<id>10</id>
<stage>1</stage>
<latency>1</latency>
</item>
<item class_id_reference="27" object_id="_35">
<id>11</id>
<stage>1</stage>
<latency>1</latency>
</item>
<item class_id_reference="27" object_id="_36">
<id>12</id>
<stage>1</stage>
<latency>1</latency>
</item>
<item class_id_reference="27" object_id="_37">
<id>15</id>
<stage>1</stage>
<latency>1</latency>
</item>
<item class_id_reference="27" object_id="_38">
<id>16</id>
<stage>1</stage>
<latency>1</latency>
</item>
<item class_id_reference="27" object_id="_39">
<id>17</id>
<stage>1</stage>
<latency>1</latency>
</item>
</operations>
</item>
</states>
<transitions class_id="28" tracking_level="0" version="0">
<count>1</count>
<item_version>0</item_version>
<item class_id="29" tracking_level="1" version="0" object_id="_40">
<inState>1</inState>
<outState>2</outState>
<condition class_id="30" tracking_level="0" version="0">
<id>2</id>
<sop class_id="31" tracking_level="0" version="0">
<count>1</count>
<item_version>0</item_version>
<item class_id="32" tracking_level="0" version="0">
<count>0</count>
<item_version>0</item_version>
</item>
</sop>
</condition>
</item>
</transitions>
</fsm>
<res class_id="33" tracking_level="1" version="0" object_id="_41">
<dp_component_resource class_id="34" tracking_level="0" version="0">
<count>0</count>
<item_version>0</item_version>
</dp_component_resource>
<dp_expression_resource>
<count>3</count>
<item_version>0</item_version>
<item class_id="35" tracking_level="0" version="0">
<first>ap_sig_bdd_51 ( or ) </first>
<second class_id="36" tracking_level="0" version="0">
<count>4</count>
<item_version>0</item_version>
<item class_id="37" tracking_level="0" version="0">
<first>(0P0)</first>
<second>1</second>
</item>
<item>
<first>(1P1)</first>
<second>1</second>
</item>
<item>
<first>FF</first>
<second>0</second>
</item>
<item>
<first>LUT</first>
<second>1</second>
</item>
</second>
</item>
<item>
<first>in_out1_o ( + ) </first>
<second>
<count>4</count>
<item_version>0</item_version>
<item>
<first>(0P0)</first>
<second>32</second>
</item>
<item>
<first>(1P1)</first>
<second>32</second>
</item>
<item>
<first>FF</first>
<second>0</second>
</item>
<item>
<first>LUT</first>
<second>32</second>
</item>
</second>
</item>
<item>
<first>tmp1_fu_57_p2 ( + ) </first>
<second>
<count>4</count>
<item_version>0</item_version>
<item>
<first>(0P0)</first>
<second>32</second>
</item>
<item>
<first>(1P1)</first>
<second>32</second>
</item>
<item>
<first>FF</first>
<second>0</second>
</item>
<item>
<first>LUT</first>
<second>32</second>
</item>
</second>
</item>
</dp_expression_resource>
<dp_fifo_resource>
<count>0</count>
<item_version>0</item_version>
</dp_fifo_resource>
<dp_memory_resource>
<count>0</count>
<item_version>0</item_version>
</dp_memory_resource>
<dp_multiplexer_resource>
<count>5</count>
<item_version>0</item_version>
<item>
<first>ap_NS_fsm</first>
<second>
<count>4</count>
<item_version>0</item_version>
<item>
<first>(0Size)</first>
<second>3</second>
</item>
<item>
<first>(1Bits)</first>
<second>1</second>
</item>
<item>
<first>(2Count)</first>
<second>3</second>
</item>
<item>
<first>LUT</first>
<second>1</second>
</item>
</second>
</item>
<item>
<first>ap_sig_ioackin_in_out1_o_ap_ack</first>
<second>
<count>4</count>
<item_version>0</item_version>
<item>
<first>(0Size)</first>
<second>2</second>
</item>
<item>
<first>(1Bits)</first>
<second>1</second>
</item>
<item>
<first>(2Count)</first>
<second>2</second>
</item>
<item>
<first>LUT</first>
<second>1</second>
</item>
</second>
</item>
<item>
<first>in1_ap_vld_in_sig</first>
<second>
<count>4</count>
<item_version>0</item_version>
<item>
<first>(0Size)</first>
<second>2</second>
</item>
<item>
<first>(1Bits)</first>
<second>1</second>
</item>
<item>
<first>(2Count)</first>
<second>2</second>
</item>
<item>
<first>LUT</first>
<second>1</second>
</item>
</second>
</item>
<item>
<first>in1_ap_vld_preg</first>
<second>
<count>4</count>
<item_version>0</item_version>
<item>
<first>(0Size)</first>
<second>2</second>
</item>
<item>
<first>(1Bits)</first>
<second>1</second>
</item>
<item>
<first>(2Count)</first>
<second>2</second>
</item>
<item>
<first>LUT</first>
<second>1</second>
</item>
</second>
</item>
<item>
<first>in1_in_sig</first>
<second>
<count>4</count>
<item_version>0</item_version>
<item>
<first>(0Size)</first>
<second>2</second>
</item>
<item>
<first>(1Bits)</first>
<second>32</second>
</item>
<item>
<first>(2Count)</first>
<second>64</second>
</item>
<item>
<first>LUT</first>
<second>32</second>
</item>
</second>
</item>
</dp_multiplexer_resource>
<dp_register_resource>
<count>6</count>
<item_version>0</item_version>
<item>
<first>ap_CS_fsm</first>
<second>
<count>3</count>
<item_version>0</item_version>
<item>
<first>(Bits)</first>
<second>2</second>
</item>
<item>
<first>(Consts)</first>
<second>0</second>
</item>
<item>
<first>FF</first>
<second>2</second>
</item>
</second>
</item>
<item>
<first>ap_reg_ioackin_in_out1_o_ap_ack</first>
<second>
<count>3</count>
<item_version>0</item_version>
<item>
<first>(Bits)</first>
<second>1</second>
</item>
<item>
<first>(Consts)</first>
<second>0</second>
</item>
<item>
<first>FF</first>
<second>1</second>
</item>
</second>
</item>
<item>
<first>in1_ap_vld_preg</first>
<second>
<count>3</count>
<item_version>0</item_version>
<item>
<first>(Bits)</first>
<second>1</second>
</item>
<item>
<first>(Consts)</first>
<second>0</second>
</item>
<item>
<first>FF</first>
<second>1</second>
</item>
</second>
</item>
<item>
<first>in1_preg</first>
<second>
<count>3</count>
<item_version>0</item_version>
<item>
<first>(Bits)</first>
<second>32</second>
</item>
<item>
<first>(Consts)</first>
<second>0</second>
</item>
<item>
<first>FF</first>
<second>32</second>
</item>
</second>
</item>
<item>
<first>in_out1_read_reg_68</first>
<second>
<count>3</count>
<item_version>0</item_version>
<item>
<first>(Bits)</first>
<second>32</second>
</item>
<item>
<first>(Consts)</first>
<second>0</second>
</item>
<item>
<first>FF</first>
<second>32</second>
</item>
</second>
</item>
<item>
<first>tmp1_reg_73</first>
<second>
<count>3</count>
<item_version>0</item_version>
<item>
<first>(Bits)</first>
<second>32</second>
</item>
<item>
<first>(Consts)</first>
<second>0</second>
</item>
<item>
<first>FF</first>
<second>32</second>
</item>
</second>
</item>
</dp_register_resource>
<dp_component_map class_id="38" tracking_level="0" version="0">
<count>0</count>
<item_version>0</item_version>
</dp_component_map>
<dp_expression_map>
<count>2</count>
<item_version>0</item_version>
<item class_id="39" tracking_level="0" version="0">
<first>in_out1_o ( + ) </first>
<second>
<count>1</count>
<item_version>0</item_version>
<item>15</item>
</second>
</item>
<item>
<first>tmp1_fu_57_p2 ( + ) </first>
<second>
<count>1</count>
<item_version>0</item_version>
<item>14</item>
</second>
</item>
</dp_expression_map>
<dp_fifo_map>
<count>0</count>
<item_version>0</item_version>
</dp_fifo_map>
<dp_memory_map>
<count>0</count>
<item_version>0</item_version>
</dp_memory_map>
</res>
<node_label_latency class_id="40" tracking_level="0" version="0">
<count>7</count>
<item_version>0</item_version>
<item class_id="41" tracking_level="0" version="0">
<first>8</first>
<second class_id="42" tracking_level="0" version="0">
<first>0</first>
<second>0</second>
</second>
</item>
<item>
<first>9</first>
<second>
<first>0</first>
<second>0</second>
</second>
</item>
<item>
<first>13</first>
<second>
<first>0</first>
<second>0</second>
</second>
</item>
<item>
<first>14</first>
<second>
<first>0</first>
<second>0</second>
</second>
</item>
<item>
<first>15</first>
<second>
<first>1</first>
<second>0</second>
</second>
</item>
<item>
<first>16</first>
<second>
<first>1</first>
<second>0</second>
</second>
</item>
<item>
<first>17</first>
<second>
<first>1</first>
<second>0</second>
</second>
</item>
</node_label_latency>
<bblk_ent_exit class_id="43" tracking_level="0" version="0">
<count>1</count>
<item_version>0</item_version>
<item class_id="44" tracking_level="0" version="0">
<first>18</first>
<second class_id="45" tracking_level="0" version="0">
<first>0</first>
<second>1</second>
</second>
</item>
</bblk_ent_exit>
<regions class_id="46" tracking_level="0" version="0">
<count>0</count>
<item_version>0</item_version>
</regions>
<dp_fu_nodes class_id="47" tracking_level="0" version="0">
<count>6</count>
<item_version>0</item_version>
<item class_id="48" tracking_level="0" version="0">
<first>32</first>
<second>
<count>1</count>
<item_version>0</item_version>
<item>8</item>
</second>
</item>
<item>
<first>38</first>
<second>
<count>1</count>
<item_version>0</item_version>
<item>9</item>
</second>
</item>
<item>
<first>44</first>
<second>
<count>1</count>
<item_version>0</item_version>
<item>13</item>
</second>
</item>
<item>
<first>50</first>
<second>
<count>1</count>
<item_version>0</item_version>
<item>16</item>
</second>
</item>
<item>
<first>57</first>
<second>
<count>1</count>
<item_version>0</item_version>
<item>14</item>
</second>
</item>
<item>
<first>63</first>
<second>
<count>1</count>
<item_version>0</item_version>
<item>15</item>
</second>
</item>
</dp_fu_nodes>
<dp_fu_nodes_expression class_id="50" tracking_level="0" version="0">
<count>2</count>
<item_version>0</item_version>
<item class_id="51" tracking_level="0" version="0">
<first>tmp1_fu_57</first>
<second>
<count>1</count>
<item_version>0</item_version>
<item>14</item>
</second>
</item>
<item>
<first>tmp_1_fu_63</first>
<second>
<count>1</count>
<item_version>0</item_version>
<item>15</item>
</second>
</item>
</dp_fu_nodes_expression>
<dp_fu_nodes_module>
<count>0</count>
<item_version>0</item_version>
</dp_fu_nodes_module>
<dp_fu_nodes_io>
<count>4</count>
<item_version>0</item_version>
<item>
<first>in1_read_read_fu_38</first>
<second>
<count>1</count>
<item_version>0</item_version>
<item>9</item>
</second>
</item>
<item>
<first>in2_read_read_fu_32</first>
<second>
<count>1</count>
<item_version>0</item_version>
<item>8</item>
</second>
</item>
<item>
<first>in_out1_read_read_fu_44</first>
<second>
<count>1</count>
<item_version>0</item_version>
<item>13</item>
</second>
</item>
<item>
<first>stg_15_write_fu_50</first>
<second>
<count>1</count>
<item_version>0</item_version>
<item>16</item>
</second>
</item>
</dp_fu_nodes_io>
<return_ports>
<count>0</count>
<item_version>0</item_version>
</return_ports>
<dp_mem_port_nodes class_id="52" tracking_level="0" version="0">
<count>0</count>
<item_version>0</item_version>
</dp_mem_port_nodes>
<dp_reg_nodes>
<count>2</count>
<item_version>0</item_version>
<item>
<first>68</first>
<second>
<count>1</count>
<item_version>0</item_version>
<item>13</item>
</second>
</item>
<item>
<first>73</first>
<second>
<count>1</count>
<item_version>0</item_version>
<item>14</item>
</second>
</item>
</dp_reg_nodes>
<dp_regname_nodes>
<count>2</count>
<item_version>0</item_version>
<item>
<first>in_out1_read_reg_68</first>
<second>
<count>1</count>
<item_version>0</item_version>
<item>13</item>
</second>
</item>
<item>
<first>tmp1_reg_73</first>
<second>
<count>1</count>
<item_version>0</item_version>
<item>14</item>
</second>
</item>
</dp_regname_nodes>
<dp_reg_phi>
<count>0</count>
<item_version>0</item_version>
</dp_reg_phi>
<dp_regname_phi>
<count>0</count>
<item_version>0</item_version>
</dp_regname_phi>
<dp_port_io_nodes class_id="53" tracking_level="0" version="0">
<count>3</count>
<item_version>0</item_version>
<item class_id="54" tracking_level="0" version="0">
<first>in1</first>
<second>
<count>1</count>
<item_version>0</item_version>
<item>
<first>read</first>
<second>
<count>1</count>
<item_version>0</item_version>
<item>9</item>
</second>
</item>
</second>
</item>
<item>
<first>in2</first>
<second>
<count>1</count>
<item_version>0</item_version>
<item>
<first>read</first>
<second>
<count>1</count>
<item_version>0</item_version>
<item>8</item>
</second>
</item>
</second>
</item>
<item>
<first>in_out1</first>
<second>
<count>2</count>
<item_version>0</item_version>
<item>
<first>read</first>
<second>
<count>1</count>
<item_version>0</item_version>
<item>13</item>
</second>
</item>
<item>
<first>write</first>
<second>
<count>1</count>
<item_version>0</item_version>
<item>16</item>
</second>
</item>
</second>
</item>
</dp_port_io_nodes>
<port2core class_id="55" tracking_level="0" version="0">
<count>0</count>
<item_version>0</item_version>
</port2core>
<node2core>
<count>0</count>
<item_version>0</item_version>
</node2core>
</syndb>
</boost_serialization>
| 30.390823 | 98 | 0.452778 |
4b67249a500ff2dfdc2fbb1b225f1c19ba058eb6 | 5,994 | adb | Ada | lib/zlib-1.2.3/contrib/ada/zlib-streams.adb | Surya361/minix-exp-lottery | de7535551e3f09764b977f1452cb4aefeee61b83 | [
"BSD-3-Clause"
] | null | null | null | lib/zlib-1.2.3/contrib/ada/zlib-streams.adb | Surya361/minix-exp-lottery | de7535551e3f09764b977f1452cb4aefeee61b83 | [
"BSD-3-Clause"
] | null | null | null | lib/zlib-1.2.3/contrib/ada/zlib-streams.adb | Surya361/minix-exp-lottery | de7535551e3f09764b977f1452cb4aefeee61b83 | [
"BSD-3-Clause"
] | null | null | null | ----------------------------------------------------------------
-- ZLib for Ada thick binding. --
-- --
-- Copyright (C) 2002-2003 Dmitriy Anisimkov --
-- --
-- Open source license information is in the zlib.ads file. --
----------------------------------------------------------------
-- $Id: zlib-streams.adb,v 1.1 2005/09/23 22:39:01 beng Exp $
with Ada.Unchecked_Deallocation;
package body ZLib.Streams is
-----------
-- Close --
-----------
procedure Close (Stream : in out Stream_Type) is
procedure Free is new Ada.Unchecked_Deallocation
(Stream_Element_Array, Buffer_Access);
begin
if Stream.Mode = Out_Stream or Stream.Mode = Duplex then
-- We should flush the data written by the writer.
Flush (Stream, Finish);
Close (Stream.Writer);
end if;
if Stream.Mode = In_Stream or Stream.Mode = Duplex then
Close (Stream.Reader);
Free (Stream.Buffer);
end if;
end Close;
------------
-- Create --
------------
procedure Create
(Stream : out Stream_Type;
Mode : in Stream_Mode;
Back : in Stream_Access;
Back_Compressed : in Boolean;
Level : in Compression_Level := Default_Compression;
Strategy : in Strategy_Type := Default_Strategy;
Header : in Header_Type := Default;
Read_Buffer_Size : in Ada.Streams.Stream_Element_Offset
:= Default_Buffer_Size;
Write_Buffer_Size : in Ada.Streams.Stream_Element_Offset
:= Default_Buffer_Size)
is
subtype Buffer_Subtype is Stream_Element_Array (1 .. Read_Buffer_Size);
procedure Init_Filter
(Filter : in out Filter_Type;
Compress : in Boolean);
-----------------
-- Init_Filter --
-----------------
procedure Init_Filter
(Filter : in out Filter_Type;
Compress : in Boolean) is
begin
if Compress then
Deflate_Init
(Filter, Level, Strategy, Header => Header);
else
Inflate_Init (Filter, Header => Header);
end if;
end Init_Filter;
begin
Stream.Back := Back;
Stream.Mode := Mode;
if Mode = Out_Stream or Mode = Duplex then
Init_Filter (Stream.Writer, Back_Compressed);
Stream.Buffer_Size := Write_Buffer_Size;
else
Stream.Buffer_Size := 0;
end if;
if Mode = In_Stream or Mode = Duplex then
Init_Filter (Stream.Reader, not Back_Compressed);
Stream.Buffer := new Buffer_Subtype;
Stream.Rest_First := Stream.Buffer'Last + 1;
Stream.Rest_Last := Stream.Buffer'Last;
end if;
end Create;
-----------
-- Flush --
-----------
procedure Flush
(Stream : in out Stream_Type;
Mode : in Flush_Mode := Sync_Flush)
is
Buffer : Stream_Element_Array (1 .. Stream.Buffer_Size);
Last : Stream_Element_Offset;
begin
loop
Flush (Stream.Writer, Buffer, Last, Mode);
Ada.Streams.Write (Stream.Back.all, Buffer (1 .. Last));
exit when Last < Buffer'Last;
end loop;
end Flush;
-------------
-- Is_Open --
-------------
function Is_Open (Stream : Stream_Type) return Boolean is
begin
return Is_Open (Stream.Reader) or else Is_Open (Stream.Writer);
end Is_Open;
----------
-- Read --
----------
procedure Read
(Stream : in out Stream_Type;
Item : out Stream_Element_Array;
Last : out Stream_Element_Offset)
is
procedure Read
(Item : out Stream_Element_Array;
Last : out Stream_Element_Offset);
----------
-- Read --
----------
procedure Read
(Item : out Stream_Element_Array;
Last : out Stream_Element_Offset) is
begin
Ada.Streams.Read (Stream.Back.all, Item, Last);
end Read;
procedure Read is new ZLib.Read
(Read => Read,
Buffer => Stream.Buffer.all,
Rest_First => Stream.Rest_First,
Rest_Last => Stream.Rest_Last);
begin
Read (Stream.Reader, Item, Last);
end Read;
-------------------
-- Read_Total_In --
-------------------
function Read_Total_In (Stream : in Stream_Type) return Count is
begin
return Total_In (Stream.Reader);
end Read_Total_In;
--------------------
-- Read_Total_Out --
--------------------
function Read_Total_Out (Stream : in Stream_Type) return Count is
begin
return Total_Out (Stream.Reader);
end Read_Total_Out;
-----------
-- Write --
-----------
procedure Write
(Stream : in out Stream_Type;
Item : in Stream_Element_Array)
is
procedure Write (Item : in Stream_Element_Array);
-----------
-- Write --
-----------
procedure Write (Item : in Stream_Element_Array) is
begin
Ada.Streams.Write (Stream.Back.all, Item);
end Write;
procedure Write is new ZLib.Write
(Write => Write,
Buffer_Size => Stream.Buffer_Size);
begin
Write (Stream.Writer, Item, No_Flush);
end Write;
--------------------
-- Write_Total_In --
--------------------
function Write_Total_In (Stream : in Stream_Type) return Count is
begin
return Total_In (Stream.Writer);
end Write_Total_In;
---------------------
-- Write_Total_Out --
---------------------
function Write_Total_Out (Stream : in Stream_Type) return Count is
begin
return Total_Out (Stream.Writer);
end Write_Total_Out;
end ZLib.Streams;
| 26.522124 | 77 | 0.51952 |
045be94553f963eb52525074dea02b20207ef721 | 4,252 | ada | Ada | gcc-gcc-7_3_0-release/gcc/testsuite/ada/acats/tests/cd/cd1009x.ada | best08618/asylo | 5a520a9f5c461ede0f32acc284017b737a43898c | [
"Apache-2.0"
] | 7 | 2020-05-02T17:34:05.000Z | 2021-10-17T10:15:18.000Z | gcc-gcc-7_3_0-release/gcc/testsuite/ada/acats/tests/cd/cd1009x.ada | best08618/asylo | 5a520a9f5c461ede0f32acc284017b737a43898c | [
"Apache-2.0"
] | null | null | null | gcc-gcc-7_3_0-release/gcc/testsuite/ada/acats/tests/cd/cd1009x.ada | best08618/asylo | 5a520a9f5c461ede0f32acc284017b737a43898c | [
"Apache-2.0"
] | 2 | 2020-07-27T00:22:36.000Z | 2021-04-01T09:41:02.000Z | -- CD1009X.ADA
-- Grant of Unlimited Rights
--
-- Under contracts F33600-87-D-0337, F33600-84-D-0280, MDA903-79-C-0687,
-- F08630-91-C-0015, and DCA100-97-D-0025, the U.S. Government obtained
-- unlimited rights in the software and documentation contained herein.
-- Unlimited rights are defined in DFAR 252.227-7013(a)(19). By making
-- this public release, the Government intends to confer upon all
-- recipients unlimited rights equal to those held by the Government.
-- These rights include rights to use, duplicate, release or disclose the
-- released technical data and computer software in whole or in part, in
-- any manner and for any purpose whatsoever, and to have or permit others
-- to do so.
--
-- DISCLAIMER
--
-- ALL MATERIALS OR INFORMATION HEREIN RELEASED, MADE AVAILABLE OR
-- DISCLOSED ARE AS IS. THE GOVERNMENT MAKES NO EXPRESS OR IMPLIED
-- WARRANTY AS TO ANY MATTER WHATSOEVER, INCLUDING THE CONDITIONS OF THE
-- SOFTWARE, DOCUMENTATION OR OTHER INFORMATION RELEASED, MADE AVAILABLE
-- OR DISCLOSED, OR THE OWNERSHIP, MERCHANTABILITY, OR FITNESS FOR A
-- PARTICULAR PURPOSE OF SAID MATERIAL.
--*
-- OBJECTIVE:
-- CHECK THAT A RECORD REPRESENTATION CLAUSE MAY BE GIVEN
-- IN THE PRIVATE PART OF A PACKAGE FOR AN INCOMPLETE TYPE, WHOSE
-- FULL TYPE DECLARATION IS A RECORD TYPE DECLARED IN THE VISIBLE
-- PART OF THE SAME PACKAGE.
-- HISTORY:
-- VCL 10/21/87 CREATED ORIGINAL TEST.
-- BCB 03/20/89 CHANGED EXTENSION FROM '.ADA' TO '.DEP', CORRECTED
-- CHECKS FOR FAILURE.
WITH SYSTEM;
WITH REPORT; USE REPORT;
PROCEDURE CD1009X IS
BEGIN
TEST ("CD1009X", "A RECORD REPRESENTATION CLAUSE MAY BE GIVEN " &
"IN THE PRIVATE PART OF A PACKAGE FOR AN " &
"INCOMPLETE TYPE, WHOSE FULL TYPE DECLARATION " &
"IS A RECORD TYPE DECLARED IN THE " &
"VISIBLE PART OF THE SAME PACKAGE");
DECLARE
PACKAGE PACK IS
UNITS_PER_INTEGER : CONSTANT :=
(INTEGER'SIZE + SYSTEM.STORAGE_UNIT - 1) /
SYSTEM.STORAGE_UNIT;
TYPE CHECK_TYPE_1;
TYPE ACC IS ACCESS CHECK_TYPE_1;
TYPE CHECK_TYPE_1 IS
RECORD
I1 : INTEGER RANGE 0 .. 255;
B1 : BOOLEAN;
B2 : BOOLEAN;
I2 : INTEGER RANGE 0 .. 15;
END RECORD;
PRIVATE
FOR CHECK_TYPE_1 USE
RECORD
I1 AT 0 * UNITS_PER_INTEGER
RANGE 0 .. INTEGER'SIZE - 1;
B1 AT 1 * UNITS_PER_INTEGER
RANGE 0 .. BOOLEAN'SIZE - 1;
B2 AT 2 * UNITS_PER_INTEGER
RANGE 0 .. BOOLEAN'SIZE - 1;
I2 AT 3 * UNITS_PER_INTEGER
RANGE 0 .. INTEGER'SIZE - 1;
END RECORD;
END PACK;
USE PACK;
R1 : CHECK_TYPE_1;
BEGIN
IF R1.I1'FIRST_BIT /= 0 OR
R1.I1'LAST_BIT /= INTEGER'SIZE - 1 OR
R1.I1'POSITION /= 0 THEN
FAILED ("INCORRECT REPRESENTATION FOR R1.I1");
END IF;
IF R1.B1'FIRST_BIT /= 0 OR
R1.B1'LAST_BIT /= BOOLEAN'SIZE - 1 OR
R1.B1'POSITION /= 1 * UNITS_PER_INTEGER THEN
FAILED ("INCORRECT REPRESENTATION FOR R1.B1");
END IF;
IF R1.B2'FIRST_BIT /= 0 OR
R1.B2'LAST_BIT /= BOOLEAN'SIZE - 1 OR
R1.B2'POSITION /= 2 * UNITS_PER_INTEGER THEN
FAILED ("INCORRECT REPRESENTATION FOR R1.B2");
END IF;
IF R1.I2'FIRST_BIT /= 0 OR
R1.I2'LAST_BIT /= INTEGER'SIZE - 1 OR
R1.I2'POSITION /= 3 * UNITS_PER_INTEGER THEN
FAILED ("INCORRECT REPRESENTATION FOR R1.I2");
END IF;
END;
RESULT;
END CD1009X;
| 40.113208 | 79 | 0.536689 |
04344d31b4fa7bc5a086b750673010161494a96a | 6,421 | adb | Ada | gcc-gcc-7_3_0-release/gcc/ada/s-osprim-posix.adb | best08618/asylo | 5a520a9f5c461ede0f32acc284017b737a43898c | [
"Apache-2.0"
] | 7 | 2020-05-02T17:34:05.000Z | 2021-10-17T10:15:18.000Z | gcc-gcc-7_3_0-release/gcc/ada/s-osprim-posix.adb | best08618/asylo | 5a520a9f5c461ede0f32acc284017b737a43898c | [
"Apache-2.0"
] | null | null | null | gcc-gcc-7_3_0-release/gcc/ada/s-osprim-posix.adb | best08618/asylo | 5a520a9f5c461ede0f32acc284017b737a43898c | [
"Apache-2.0"
] | 2 | 2020-07-27T00:22:36.000Z | 2021-04-01T09:41:02.000Z | ------------------------------------------------------------------------------
-- --
-- GNAT RUN-TIME LIBRARY (GNARL) COMPONENTS --
-- --
-- S Y S T E M . O S _ P R I M I T I V E S --
-- --
-- B o d y --
-- --
-- Copyright (C) 1998-2015, Free Software Foundation, Inc. --
-- --
-- GNARL is free software; you can redistribute it and/or modify it under --
-- terms of the GNU General Public License as published by the Free Soft- --
-- ware Foundation; either version 3, or (at your option) any later ver- --
-- sion. GNAT is distributed in the hope that it will be useful, but WITH- --
-- OUT ANY WARRANTY; without even the implied warranty of MERCHANTABILITY --
-- or FITNESS FOR A PARTICULAR PURPOSE. --
-- --
-- As a special exception under Section 7 of GPL version 3, you are granted --
-- additional permissions described in the GCC Runtime Library Exception, --
-- version 3.1, as published by the Free Software Foundation. --
-- --
-- You should have received a copy of the GNU General Public License and --
-- a copy of the GCC Runtime Library Exception along with this program; --
-- see the files COPYING3 and COPYING.RUNTIME respectively. If not, see --
-- <http://www.gnu.org/licenses/>. --
-- --
-- GNARL was developed by the GNARL team at Florida State University. --
-- Extensive contributions were provided by Ada Core Technologies, Inc. --
-- --
------------------------------------------------------------------------------
-- This version is for POSIX-like operating systems
package body System.OS_Primitives is
-- ??? These definitions are duplicated from System.OS_Interface
-- because we don't want to depend on any package. Consider removing
-- these declarations in System.OS_Interface and move these ones in
-- the spec.
type time_t is new Long_Integer;
type timespec is record
tv_sec : time_t;
tv_nsec : Long_Integer;
end record;
pragma Convention (C, timespec);
function nanosleep (rqtp, rmtp : not null access timespec) return Integer;
pragma Import (C, nanosleep, "nanosleep");
-----------
-- Clock --
-----------
function Clock return Duration is
type timeval is array (1 .. 3) of Long_Integer;
-- The timeval array is sized to contain Long_Long_Integer sec and
-- Long_Integer usec. If Long_Long_Integer'Size = Long_Integer'Size then
-- it will be overly large but that will not effect the implementation
-- since it is not accessed directly.
procedure timeval_to_duration
(T : not null access timeval;
sec : not null access Long_Long_Integer;
usec : not null access Long_Integer);
pragma Import (C, timeval_to_duration, "__gnat_timeval_to_duration");
Micro : constant := 10**6;
sec : aliased Long_Long_Integer;
usec : aliased Long_Integer;
TV : aliased timeval;
Result : Integer;
pragma Unreferenced (Result);
function gettimeofday
(Tv : access timeval;
Tz : System.Address := System.Null_Address) return Integer;
pragma Import (C, gettimeofday, "gettimeofday");
begin
-- The return codes for gettimeofday are as follows (from man pages):
-- EPERM settimeofday is called by someone other than the superuser
-- EINVAL Timezone (or something else) is invalid
-- EFAULT One of tv or tz pointed outside accessible address space
-- None of these codes signal a potential clock skew, hence the return
-- value is never checked.
Result := gettimeofday (TV'Access, System.Null_Address);
timeval_to_duration (TV'Access, sec'Access, usec'Access);
return Duration (sec) + Duration (usec) / Micro;
end Clock;
-----------------
-- To_Timespec --
-----------------
function To_Timespec (D : Duration) return timespec;
function To_Timespec (D : Duration) return timespec is
S : time_t;
F : Duration;
begin
S := time_t (Long_Long_Integer (D));
F := D - Duration (S);
-- If F has negative value due to a round-up, adjust for positive F
-- value.
if F < 0.0 then
S := S - 1;
F := F + 1.0;
end if;
return
timespec'(tv_sec => S,
tv_nsec => Long_Integer (Long_Long_Integer (F * 10#1#E9)));
end To_Timespec;
-----------------
-- Timed_Delay --
-----------------
procedure Timed_Delay
(Time : Duration;
Mode : Integer)
is
Request : aliased timespec;
Remaind : aliased timespec;
Rel_Time : Duration;
Abs_Time : Duration;
Base_Time : constant Duration := Clock;
Check_Time : Duration := Base_Time;
Result : Integer;
pragma Unreferenced (Result);
begin
if Mode = Relative then
Rel_Time := Time;
Abs_Time := Time + Check_Time;
else
Rel_Time := Time - Check_Time;
Abs_Time := Time;
end if;
if Rel_Time > 0.0 then
loop
Request := To_Timespec (Rel_Time);
Result := nanosleep (Request'Access, Remaind'Access);
Check_Time := Clock;
exit when Abs_Time <= Check_Time or else Check_Time < Base_Time;
Rel_Time := Abs_Time - Check_Time;
end loop;
end if;
end Timed_Delay;
----------------
-- Initialize --
----------------
procedure Initialize is
begin
null;
end Initialize;
end System.OS_Primitives;
| 37.115607 | 79 | 0.516275 |
9a70cf3cb80c98f715e871ecede257fd32de53e9 | 32,970 | ads | Ada | src/hershey_fonts/giza-hershey_fonts-greek.ads | Fabien-Chouteau/Giza | 9f6c167666dbba8f0e5f0ba3e33825c0b3f399bd | [
"BSD-3-Clause"
] | 7 | 2017-10-18T02:40:24.000Z | 2020-12-19T22:41:19.000Z | src/hershey_fonts/giza-hershey_fonts-greek.ads | Fabien-Chouteau/Giza | 9f6c167666dbba8f0e5f0ba3e33825c0b3f399bd | [
"BSD-3-Clause"
] | null | null | null | src/hershey_fonts/giza-hershey_fonts-greek.ads | Fabien-Chouteau/Giza | 9f6c167666dbba8f0e5f0ba3e33825c0b3f399bd | [
"BSD-3-Clause"
] | 2 | 2019-05-06T08:30:26.000Z | 2020-11-22T11:27:27.000Z | package Giza.Hershey_Fonts.Greek is
Font : constant Giza.Font.Ref_Const;
private
Glyph_0 : aliased constant Glyph :=
(Number_Of_Vectors => 0,
Width => 16,
Height => 0,
Y_Offset => 0,
X_Offset => -8,
Vects => (others => (Raise_Pen)));
Glyph_1 : aliased constant Glyph :=
(Number_Of_Vectors => 9,
Width => 10,
Height => 21,
Y_Offset => -12,
X_Offset => -5,
Vects => (Raise_Pen,
(0, -12),
(0, 2),
Raise_Pen,
(0, 7),
(-1, 8),
(0, 9),
(1, 8),
(0, 7)));
Glyph_2 : aliased constant Glyph :=
(Number_Of_Vectors => 6,
Width => 16,
Height => 7,
Y_Offset => -12,
X_Offset => -8,
Vects => (Raise_Pen,
(-4, -12),
(-4, -5),
Raise_Pen,
(4, -12),
(4, -5)));
Glyph_3 : aliased constant Glyph :=
(Number_Of_Vectors => 12,
Width => 21,
Height => 32,
Y_Offset => -16,
X_Offset => -10,
Vects => (Raise_Pen,
(1, -16),
(-6, 16),
Raise_Pen,
(7, -16),
(0, 16),
Raise_Pen,
(-6, -3),
(8, -3),
Raise_Pen,
(-7, 3),
(7, 3)));
Glyph_4 : aliased constant Glyph :=
(Number_Of_Vectors => 27,
Width => 20,
Height => 29,
Y_Offset => -16,
X_Offset => -10,
Vects => (Raise_Pen,
(-2, -16),
(-2, 13),
Raise_Pen,
(2, -16),
(2, 13),
Raise_Pen,
(7, -9),
(5, -11),
(2, -12),
(-2, -12),
(-5, -11),
(-7, -9),
(-7, -7),
(-6, -5),
(-5, -4),
(-3, -3),
(3, -1),
(5, 0),
(6, 1),
(7, 3),
(7, 6),
(5, 8),
(2, 9),
(-2, 9),
(-5, 8),
(-7, 6)));
Glyph_5 : aliased constant Glyph :=
(Number_Of_Vectors => 32,
Width => 24,
Height => 21,
Y_Offset => -12,
X_Offset => -12,
Vects => (Raise_Pen,
(9, -12),
(-9, 9),
Raise_Pen,
(-4, -12),
(-2, -10),
(-2, -8),
(-3, -6),
(-5, -5),
(-7, -5),
(-9, -7),
(-9, -9),
(-8, -11),
(-6, -12),
(-4, -12),
(-2, -11),
(1, -10),
(4, -10),
(7, -11),
(9, -12),
Raise_Pen,
(5, 2),
(3, 3),
(2, 5),
(2, 7),
(4, 9),
(6, 9),
(8, 8),
(9, 6),
(9, 4),
(7, 2),
(5, 2)));
Glyph_6 : aliased constant Glyph :=
(Number_Of_Vectors => 35,
Width => 26,
Height => 21,
Y_Offset => -12,
X_Offset => -13,
Vects => (Raise_Pen,
(10, -3),
(10, -4),
(9, -5),
(8, -5),
(7, -4),
(6, -2),
(4, 3),
(2, 6),
(0, 8),
(-2, 9),
(-6, 9),
(-8, 8),
(-9, 7),
(-10, 5),
(-10, 3),
(-9, 1),
(-8, 0),
(-1, -4),
(0, -5),
(1, -7),
(1, -9),
(0, -11),
(-2, -12),
(-4, -11),
(-5, -9),
(-5, -7),
(-4, -4),
(-2, -1),
(3, 6),
(5, 8),
(7, 9),
(9, 9),
(10, 8),
(10, 7)));
Glyph_7 : aliased constant Glyph :=
(Number_Of_Vectors => 8,
Width => 10,
Height => 6,
Y_Offset => -12,
X_Offset => -5,
Vects => (Raise_Pen,
(0, -10),
(-1, -11),
(0, -12),
(1, -11),
(1, -9),
(0, -7),
(-1, -6)));
Glyph_8 : aliased constant Glyph :=
(Number_Of_Vectors => 11,
Width => 14,
Height => 32,
Y_Offset => -16,
X_Offset => -7,
Vects => (Raise_Pen,
(4, -16),
(2, -14),
(0, -11),
(-2, -7),
(-3, -2),
(-3, 2),
(-2, 7),
(0, 11),
(2, 14),
(4, 16)));
Glyph_9 : aliased constant Glyph :=
(Number_Of_Vectors => 11,
Width => 14,
Height => 32,
Y_Offset => -16,
X_Offset => -7,
Vects => (Raise_Pen,
(-4, -16),
(-2, -14),
(0, -11),
(2, -7),
(3, -2),
(3, 2),
(2, 7),
(0, 11),
(-2, 14),
(-4, 16)));
Glyph_10 : aliased constant Glyph :=
(Number_Of_Vectors => 9,
Width => 16,
Height => 12,
Y_Offset => -6,
X_Offset => -8,
Vects => (Raise_Pen,
(0, -6),
(0, 6),
Raise_Pen,
(-5, -3),
(5, 3),
Raise_Pen,
(5, -3),
(-5, 3)));
Glyph_11 : aliased constant Glyph :=
(Number_Of_Vectors => 6,
Width => 26,
Height => 18,
Y_Offset => -9,
X_Offset => -13,
Vects => (Raise_Pen,
(0, -9),
(0, 9),
Raise_Pen,
(-9, 0),
(9, 0)));
Glyph_12 : aliased constant Glyph :=
(Number_Of_Vectors => 8,
Width => 8,
Height => 5,
Y_Offset => 4,
X_Offset => -4,
Vects => (Raise_Pen,
(1, 5),
(0, 6),
(-1, 5),
(0, 4),
(1, 5),
(1, 7),
(-1, 9)));
Glyph_13 : aliased constant Glyph :=
(Number_Of_Vectors => 3,
Width => 26,
Height => 0,
Y_Offset => 0,
X_Offset => -13,
Vects => (Raise_Pen,
(-9, 0),
(9, 0)));
Glyph_14 : aliased constant Glyph :=
(Number_Of_Vectors => 6,
Width => 8,
Height => 2,
Y_Offset => 4,
X_Offset => -4,
Vects => (Raise_Pen,
(0, 4),
(-1, 5),
(0, 6),
(1, 5),
(0, 4)));
Glyph_15 : aliased constant Glyph :=
(Number_Of_Vectors => 3,
Width => 22,
Height => 32,
Y_Offset => -16,
X_Offset => -11,
Vects => (Raise_Pen,
(9, -16),
(-9, 16)));
Glyph_16 : aliased constant Glyph :=
(Number_Of_Vectors => 18,
Width => 20,
Height => 21,
Y_Offset => -12,
X_Offset => -10,
Vects => (Raise_Pen,
(-1, -12),
(-4, -11),
(-6, -8),
(-7, -3),
(-7, 0),
(-6, 5),
(-4, 8),
(-1, 9),
(1, 9),
(4, 8),
(6, 5),
(7, 0),
(7, -3),
(6, -8),
(4, -11),
(1, -12),
(-1, -12)));
Glyph_17 : aliased constant Glyph :=
(Number_Of_Vectors => 5,
Width => 20,
Height => 21,
Y_Offset => -12,
X_Offset => -10,
Vects => (Raise_Pen,
(-4, -8),
(-2, -9),
(1, -12),
(1, 9)));
Glyph_18 : aliased constant Glyph :=
(Number_Of_Vectors => 15,
Width => 20,
Height => 21,
Y_Offset => -12,
X_Offset => -10,
Vects => (Raise_Pen,
(-6, -7),
(-6, -8),
(-5, -10),
(-4, -11),
(-2, -12),
(2, -12),
(4, -11),
(5, -10),
(6, -8),
(6, -6),
(5, -4),
(3, -1),
(-7, 9),
(7, 9)));
Glyph_19 : aliased constant Glyph :=
(Number_Of_Vectors => 16,
Width => 20,
Height => 21,
Y_Offset => -12,
X_Offset => -10,
Vects => (Raise_Pen,
(-5, -12),
(6, -12),
(0, -4),
(3, -4),
(5, -3),
(6, -2),
(7, 1),
(7, 3),
(6, 6),
(4, 8),
(1, 9),
(-2, 9),
(-5, 8),
(-6, 7),
(-7, 5)));
Glyph_20 : aliased constant Glyph :=
(Number_Of_Vectors => 7,
Width => 20,
Height => 21,
Y_Offset => -12,
X_Offset => -10,
Vects => (Raise_Pen,
(3, -12),
(-7, 2),
(8, 2),
Raise_Pen,
(3, -12),
(3, 9)));
Glyph_21 : aliased constant Glyph :=
(Number_Of_Vectors => 18,
Width => 20,
Height => 21,
Y_Offset => -12,
X_Offset => -10,
Vects => (Raise_Pen,
(5, -12),
(-5, -12),
(-6, -3),
(-5, -4),
(-2, -5),
(1, -5),
(4, -4),
(6, -2),
(7, 1),
(7, 3),
(6, 6),
(4, 8),
(1, 9),
(-2, 9),
(-5, 8),
(-6, 7),
(-7, 5)));
Glyph_22 : aliased constant Glyph :=
(Number_Of_Vectors => 24,
Width => 20,
Height => 21,
Y_Offset => -12,
X_Offset => -10,
Vects => (Raise_Pen,
(6, -9),
(5, -11),
(2, -12),
(0, -12),
(-3, -11),
(-5, -8),
(-6, -3),
(-6, 2),
(-5, 6),
(-3, 8),
(0, 9),
(1, 9),
(4, 8),
(6, 6),
(7, 3),
(7, 2),
(6, -1),
(4, -3),
(1, -4),
(0, -4),
(-3, -3),
(-5, -1),
(-6, 2)));
Glyph_23 : aliased constant Glyph :=
(Number_Of_Vectors => 6,
Width => 20,
Height => 21,
Y_Offset => -12,
X_Offset => -10,
Vects => (Raise_Pen,
(7, -12),
(-3, 9),
Raise_Pen,
(-7, -12),
(7, -12)));
Glyph_24 : aliased constant Glyph :=
(Number_Of_Vectors => 30,
Width => 20,
Height => 21,
Y_Offset => -12,
X_Offset => -10,
Vects => (Raise_Pen,
(-2, -12),
(-5, -11),
(-6, -9),
(-6, -7),
(-5, -5),
(-3, -4),
(1, -3),
(4, -2),
(6, 0),
(7, 2),
(7, 5),
(6, 7),
(5, 8),
(2, 9),
(-2, 9),
(-5, 8),
(-6, 7),
(-7, 5),
(-7, 2),
(-6, 0),
(-4, -2),
(-1, -3),
(3, -4),
(5, -5),
(6, -7),
(6, -9),
(5, -11),
(2, -12),
(-2, -12)));
Glyph_25 : aliased constant Glyph :=
(Number_Of_Vectors => 24,
Width => 20,
Height => 21,
Y_Offset => -12,
X_Offset => -10,
Vects => (Raise_Pen,
(6, -5),
(5, -2),
(3, 0),
(0, 1),
(-1, 1),
(-4, 0),
(-6, -2),
(-7, -5),
(-7, -6),
(-6, -9),
(-4, -11),
(-1, -12),
(0, -12),
(3, -11),
(5, -9),
(6, -5),
(6, 0),
(5, 5),
(3, 8),
(0, 9),
(-2, 9),
(-5, 8),
(-6, 6)));
Glyph_26 : aliased constant Glyph :=
(Number_Of_Vectors => 12,
Width => 8,
Height => 9,
Y_Offset => -3,
X_Offset => -4,
Vects => (Raise_Pen,
(0, -3),
(-1, -2),
(0, -1),
(1, -2),
(0, -3),
Raise_Pen,
(0, 4),
(-1, 5),
(0, 6),
(1, 5),
(0, 4)));
Glyph_27 : aliased constant Glyph :=
(Number_Of_Vectors => 14,
Width => 8,
Height => 12,
Y_Offset => -3,
X_Offset => -4,
Vects => (Raise_Pen,
(0, -3),
(-1, -2),
(0, -1),
(1, -2),
(0, -3),
Raise_Pen,
(1, 5),
(0, 6),
(-1, 5),
(0, 4),
(1, 5),
(1, 7),
(-1, 9)));
Glyph_28 : aliased constant Glyph :=
(Number_Of_Vectors => 4,
Width => 24,
Height => 18,
Y_Offset => -9,
X_Offset => -12,
Vects => (Raise_Pen,
(8, -9),
(-8, 0),
(8, 9)));
Glyph_29 : aliased constant Glyph :=
(Number_Of_Vectors => 6,
Width => 26,
Height => 6,
Y_Offset => -3,
X_Offset => -13,
Vects => (Raise_Pen,
(-9, -3),
(9, -3),
Raise_Pen,
(-9, 3),
(9, 3)));
Glyph_30 : aliased constant Glyph :=
(Number_Of_Vectors => 4,
Width => 24,
Height => 18,
Y_Offset => -9,
X_Offset => -12,
Vects => (Raise_Pen,
(-8, -9),
(8, 0),
(-8, 9)));
Glyph_31 : aliased constant Glyph :=
(Number_Of_Vectors => 21,
Width => 18,
Height => 21,
Y_Offset => -12,
X_Offset => -9,
Vects => (Raise_Pen,
(-6, -7),
(-6, -8),
(-5, -10),
(-4, -11),
(-2, -12),
(2, -12),
(4, -11),
(5, -10),
(6, -8),
(6, -6),
(5, -4),
(4, -3),
(0, -1),
(0, 2),
Raise_Pen,
(0, 7),
(-1, 8),
(0, 9),
(1, 8),
(0, 7)));
Glyph_32 : aliased constant Glyph :=
(Number_Of_Vectors => 56,
Width => 27,
Height => 21,
Y_Offset => -12,
X_Offset => -13,
Vects => (Raise_Pen,
(5, -4),
(4, -6),
(2, -7),
(-1, -7),
(-3, -6),
(-4, -5),
(-5, -2),
(-5, 1),
(-4, 3),
(-2, 4),
(1, 4),
(3, 3),
(4, 1),
Raise_Pen,
(-1, -7),
(-3, -5),
(-4, -2),
(-4, 1),
(-3, 3),
(-2, 4),
Raise_Pen,
(5, -7),
(4, 1),
(4, 3),
(6, 4),
(8, 4),
(10, 2),
(11, -1),
(11, -3),
(10, -6),
(9, -8),
(7, -10),
(5, -11),
(2, -12),
(-1, -12),
(-4, -11),
(-6, -10),
(-8, -8),
(-9, -6),
(-10, -3),
(-10, 0),
(-9, 3),
(-8, 5),
(-6, 7),
(-4, 8),
(-1, 9),
(2, 9),
(5, 8),
(7, 7),
(8, 6),
Raise_Pen,
(6, -7),
(5, 1),
(5, 3),
(6, 4)));
Glyph_33 : aliased constant Glyph :=
(Number_Of_Vectors => 9,
Width => 18,
Height => 21,
Y_Offset => -12,
X_Offset => -9,
Vects => (Raise_Pen,
(0, -12),
(-8, 9),
Raise_Pen,
(0, -12),
(8, 9),
Raise_Pen,
(-5, 2),
(5, 2)));
Glyph_34 : aliased constant Glyph :=
(Number_Of_Vectors => 24,
Width => 21,
Height => 21,
Y_Offset => -12,
X_Offset => -11,
Vects => (Raise_Pen,
(-7, -12),
(-7, 9),
Raise_Pen,
(-7, -12),
(2, -12),
(5, -11),
(6, -10),
(7, -8),
(7, -6),
(6, -4),
(5, -3),
(2, -2),
Raise_Pen,
(-7, -2),
(2, -2),
(5, -1),
(6, 0),
(7, 2),
(7, 5),
(6, 7),
(5, 8),
(2, 9),
(-7, 9)));
Glyph_35 : aliased constant Glyph :=
(Number_Of_Vectors => 6,
Width => 20,
Height => 21,
Y_Offset => -12,
X_Offset => -10,
Vects => (Raise_Pen,
(-7, -12),
(7, 9),
Raise_Pen,
(-7, 9),
(7, -12)));
Glyph_36 : aliased constant Glyph :=
(Number_Of_Vectors => 9,
Width => 18,
Height => 21,
Y_Offset => -12,
X_Offset => -9,
Vects => (Raise_Pen,
(0, -12),
(-8, 9),
Raise_Pen,
(0, -12),
(8, 9),
Raise_Pen,
(-8, 9),
(8, 9)));
Glyph_37 : aliased constant Glyph :=
(Number_Of_Vectors => 12,
Width => 19,
Height => 21,
Y_Offset => -12,
X_Offset => -10,
Vects => (Raise_Pen,
(-6, -12),
(-6, 9),
Raise_Pen,
(-6, -12),
(7, -12),
Raise_Pen,
(-6, -2),
(2, -2),
Raise_Pen,
(-6, 9),
(7, 9)));
Glyph_38 : aliased constant Glyph :=
(Number_Of_Vectors => 21,
Width => 20,
Height => 21,
Y_Offset => -12,
X_Offset => -10,
Vects => (Raise_Pen,
(0, -12),
(0, 9),
Raise_Pen,
(-2, -7),
(-5, -6),
(-6, -5),
(-7, -3),
(-7, 0),
(-6, 2),
(-5, 3),
(-2, 4),
(2, 4),
(5, 3),
(6, 2),
(7, 0),
(7, -3),
(6, -5),
(5, -6),
(2, -7),
(-2, -7)));
Glyph_39 : aliased constant Glyph :=
(Number_Of_Vectors => 6,
Width => 17,
Height => 21,
Y_Offset => -12,
X_Offset => -10,
Vects => (Raise_Pen,
(-6, -12),
(-6, 9),
Raise_Pen,
(-6, -12),
(6, -12)));
Glyph_40 : aliased constant Glyph :=
(Number_Of_Vectors => 9,
Width => 22,
Height => 21,
Y_Offset => -12,
X_Offset => -11,
Vects => (Raise_Pen,
(-7, -12),
(-7, 9),
Raise_Pen,
(7, -12),
(7, 9),
Raise_Pen,
(-7, -2),
(7, -2)));
Glyph_41 : aliased constant Glyph :=
(Number_Of_Vectors => 3,
Width => 8,
Height => 21,
Y_Offset => -12,
X_Offset => -4,
Vects => (Raise_Pen,
(0, -12),
(0, 9)));
Glyph_42 : aliased constant Glyph :=
(Number_Of_Vectors => 6,
Width => 5,
Height => 1,
Y_Offset => -1,
X_Offset => -2,
Vects => (Raise_Pen,
(0, -1),
(0, 0),
(1, 0),
(1, -1),
(0, -1)));
Glyph_43 : aliased constant Glyph :=
(Number_Of_Vectors => 9,
Width => 21,
Height => 21,
Y_Offset => -12,
X_Offset => -11,
Vects => (Raise_Pen,
(-7, -12),
(-7, 9),
Raise_Pen,
(7, -12),
(-7, 2),
Raise_Pen,
(-2, -3),
(7, 9)));
Glyph_44 : aliased constant Glyph :=
(Number_Of_Vectors => 6,
Width => 18,
Height => 21,
Y_Offset => -12,
X_Offset => -9,
Vects => (Raise_Pen,
(0, -12),
(-8, 9),
Raise_Pen,
(0, -12),
(8, 9)));
Glyph_45 : aliased constant Glyph :=
(Number_Of_Vectors => 12,
Width => 24,
Height => 21,
Y_Offset => -12,
X_Offset => -12,
Vects => (Raise_Pen,
(-8, -12),
(-8, 9),
Raise_Pen,
(-8, -12),
(0, 9),
Raise_Pen,
(8, -12),
(0, 9),
Raise_Pen,
(8, -12),
(8, 9)));
Glyph_46 : aliased constant Glyph :=
(Number_Of_Vectors => 9,
Width => 22,
Height => 21,
Y_Offset => -12,
X_Offset => -11,
Vects => (Raise_Pen,
(-7, -12),
(-7, 9),
Raise_Pen,
(-7, -12),
(7, 9),
Raise_Pen,
(7, -12),
(7, 9)));
Glyph_47 : aliased constant Glyph :=
(Number_Of_Vectors => 22,
Width => 22,
Height => 21,
Y_Offset => -12,
X_Offset => -11,
Vects => (Raise_Pen,
(-2, -12),
(-4, -11),
(-6, -9),
(-7, -7),
(-8, -4),
(-8, 1),
(-7, 4),
(-6, 6),
(-4, 8),
(-2, 9),
(2, 9),
(4, 8),
(6, 6),
(7, 4),
(8, 1),
(8, -4),
(7, -7),
(6, -9),
(4, -11),
(2, -12),
(-2, -12)));
Glyph_48 : aliased constant Glyph :=
(Number_Of_Vectors => 9,
Width => 22,
Height => 21,
Y_Offset => -12,
X_Offset => -11,
Vects => (Raise_Pen,
(-7, -12),
(-7, 9),
Raise_Pen,
(7, -12),
(7, 9),
Raise_Pen,
(-7, -12),
(7, -12)));
Glyph_49 : aliased constant Glyph :=
(Number_Of_Vectors => 25,
Width => 22,
Height => 21,
Y_Offset => -12,
X_Offset => -11,
Vects => (Raise_Pen,
(-2, -12),
(-4, -11),
(-6, -9),
(-7, -7),
(-8, -4),
(-8, 1),
(-7, 4),
(-6, 6),
(-4, 8),
(-2, 9),
(2, 9),
(4, 8),
(6, 6),
(7, 4),
(8, 1),
(8, -4),
(7, -7),
(6, -9),
(4, -11),
(2, -12),
(-2, -12),
Raise_Pen,
(-3, -2),
(3, -2)));
Glyph_50 : aliased constant Glyph :=
(Number_Of_Vectors => 14,
Width => 21,
Height => 21,
Y_Offset => -12,
X_Offset => -11,
Vects => (Raise_Pen,
(-7, -12),
(-7, 9),
Raise_Pen,
(-7, -12),
(2, -12),
(5, -11),
(6, -10),
(7, -8),
(7, -5),
(6, -3),
(5, -2),
(2, -1),
(-7, -1)));
Glyph_51 : aliased constant Glyph :=
(Number_Of_Vectors => 10,
Width => 18,
Height => 21,
Y_Offset => -12,
X_Offset => -9,
Vects => (Raise_Pen,
(-7, -12),
(0, -2),
(-7, 9),
Raise_Pen,
(-7, -12),
(7, -12),
Raise_Pen,
(-7, 9),
(7, 9)));
Glyph_52 : aliased constant Glyph :=
(Number_Of_Vectors => 6,
Width => 16,
Height => 21,
Y_Offset => -12,
X_Offset => -8,
Vects => (Raise_Pen,
(0, -12),
(0, 9),
Raise_Pen,
(-7, -12),
(7, -12)));
Glyph_53 : aliased constant Glyph :=
(Number_Of_Vectors => 19,
Width => 18,
Height => 21,
Y_Offset => -12,
X_Offset => -9,
Vects => (Raise_Pen,
(-7, -7),
(-7, -9),
(-6, -11),
(-5, -12),
(-3, -12),
(-2, -11),
(-1, -9),
(0, -5),
(0, 9),
Raise_Pen,
(7, -7),
(7, -9),
(6, -11),
(5, -12),
(3, -12),
(2, -11),
(1, -9),
(0, -5)));
Glyph_54 : aliased constant Glyph :=
(Number_Of_Vectors => 14,
Width => 14,
Height => 8,
Y_Offset => -12,
X_Offset => -7,
Vects => (Raise_Pen,
(-1, -12),
(-3, -11),
(-4, -9),
(-4, -7),
(-3, -5),
(-1, -4),
(1, -4),
(3, -5),
(4, -7),
(4, -9),
(3, -11),
(1, -12),
(-1, -12)));
Glyph_55 : aliased constant Glyph :=
(Number_Of_Vectors => 17,
Width => 20,
Height => 21,
Y_Offset => -12,
X_Offset => -10,
Vects => (Raise_Pen,
(-7, 9),
(-3, 9),
(-6, 2),
(-7, -2),
(-7, -6),
(-6, -9),
(-4, -11),
(-1, -12),
(1, -12),
(4, -11),
(6, -9),
(7, -6),
(7, -2),
(6, 2),
(3, 9),
(7, 9)));
Glyph_56 : aliased constant Glyph :=
(Number_Of_Vectors => 9,
Width => 18,
Height => 21,
Y_Offset => -12,
X_Offset => -9,
Vects => (Raise_Pen,
(-7, -12),
(7, -12),
Raise_Pen,
(-3, -2),
(3, -2),
Raise_Pen,
(-7, 9),
(7, 9)));
Glyph_57 : aliased constant Glyph :=
(Number_Of_Vectors => 18,
Width => 22,
Height => 21,
Y_Offset => -12,
X_Offset => -11,
Vects => (Raise_Pen,
(0, -12),
(0, 9),
Raise_Pen,
(-9, -6),
(-8, -6),
(-7, -5),
(-6, -1),
(-5, 1),
(-4, 2),
(-1, 3),
(1, 3),
(4, 2),
(5, 1),
(6, -1),
(7, -5),
(8, -6),
(9, -6)));
Glyph_58 : aliased constant Glyph :=
(Number_Of_Vectors => 9,
Width => 20,
Height => 21,
Y_Offset => -12,
X_Offset => -10,
Vects => (Raise_Pen,
(7, -12),
(-7, 9),
Raise_Pen,
(-7, -12),
(7, -12),
Raise_Pen,
(-7, 9),
(7, 9)));
Glyph_59 : aliased constant Glyph :=
(Number_Of_Vectors => 12,
Width => 14,
Height => 32,
Y_Offset => -16,
X_Offset => -7,
Vects => (Raise_Pen,
(-3, -16),
(-3, 16),
Raise_Pen,
(-2, -16),
(-2, 16),
Raise_Pen,
(-3, -16),
(4, -16),
Raise_Pen,
(-3, 16),
(4, 16)));
Glyph_60 : aliased constant Glyph :=
(Number_Of_Vectors => 3,
Width => 14,
Height => 24,
Y_Offset => -12,
X_Offset => -7,
Vects => (Raise_Pen,
(-7, -12),
(7, 12)));
Glyph_61 : aliased constant Glyph :=
(Number_Of_Vectors => 12,
Width => 14,
Height => 32,
Y_Offset => -16,
X_Offset => -7,
Vects => (Raise_Pen,
(2, -16),
(2, 16),
Raise_Pen,
(3, -16),
(3, 16),
Raise_Pen,
(-4, -16),
(3, -16),
Raise_Pen,
(-4, 16),
(3, 16)));
Glyph_62 : aliased constant Glyph :=
(Number_Of_Vectors => 6,
Width => 16,
Height => 14,
Y_Offset => -14,
X_Offset => -8,
Vects => (Raise_Pen,
(0, -14),
(-8, 0),
Raise_Pen,
(0, -14),
(8, 0)));
Glyph_63 : aliased constant Glyph :=
(Number_Of_Vectors => 3,
Width => 18,
Height => 0,
Y_Offset => 16,
X_Offset => -9,
Vects => (Raise_Pen,
(-9, 16),
(9, 16)));
Glyph_64 : aliased constant Glyph :=
(Number_Of_Vectors => 8,
Width => 8,
Height => 5,
Y_Offset => -7,
X_Offset => -4,
Vects => (Raise_Pen,
(1, -7),
(-1, -5),
(-1, -3),
(0, -2),
(1, -3),
(0, -4),
(-1, -3)));
Glyph_65 : aliased constant Glyph :=
(Number_Of_Vectors => 24,
Width => 21,
Height => 14,
Y_Offset => -5,
X_Offset => -10,
Vects => (Raise_Pen,
(-1, -5),
(-3, -4),
(-5, -2),
(-6, 0),
(-7, 3),
(-7, 6),
(-6, 8),
(-4, 9),
(-2, 9),
(0, 8),
(3, 5),
(5, 2),
(7, -2),
(8, -5),
Raise_Pen,
(-1, -5),
(1, -5),
(2, -4),
(3, -2),
(5, 6),
(6, 8),
(7, 9),
(8, 9)));
Glyph_66 : aliased constant Glyph :=
(Number_Of_Vectors => 31,
Width => 19,
Height => 28,
Y_Offset => -12,
X_Offset => -9,
Vects => (Raise_Pen,
(3, -12),
(1, -11),
(-1, -9),
(-3, -5),
(-4, -2),
(-5, 2),
(-6, 8),
(-7, 16),
Raise_Pen,
(3, -12),
(5, -12),
(7, -10),
(7, -7),
(6, -5),
(5, -4),
(3, -3),
(0, -3),
Raise_Pen,
(0, -3),
(2, -2),
(4, 0),
(5, 2),
(5, 5),
(4, 7),
(3, 8),
(1, 9),
(-1, 9),
(-3, 8),
(-4, 7),
(-5, 4)));
Glyph_67 : aliased constant Glyph :=
(Number_Of_Vectors => 14,
Width => 18,
Height => 21,
Y_Offset => -5,
X_Offset => -9,
Vects => (Raise_Pen,
(-7, -5),
(-5, -5),
(-3, -3),
(3, 14),
(5, 16),
(7, 16),
Raise_Pen,
(8, -5),
(7, -3),
(5, 0),
(-5, 11),
(-7, 14),
(-8, 16)));
Glyph_68 : aliased constant Glyph :=
(Number_Of_Vectors => 24,
Width => 18,
Height => 21,
Y_Offset => -12,
X_Offset => -9,
Vects => (Raise_Pen,
(2, -5),
(-1, -5),
(-3, -4),
(-5, -2),
(-6, 1),
(-6, 4),
(-5, 7),
(-4, 8),
(-2, 9),
(0, 9),
(2, 8),
(4, 6),
(5, 3),
(5, 0),
(4, -3),
(2, -5),
(0, -7),
(-1, -9),
(-1, -11),
(0, -12),
(2, -12),
(4, -11),
(6, -9)));
Glyph_69 : aliased constant Glyph :=
(Number_Of_Vectors => 19,
Width => 16,
Height => 14,
Y_Offset => -5,
X_Offset => -8,
Vects => (Raise_Pen,
(5, -3),
(4, -4),
(2, -5),
(-1, -5),
(-3, -4),
(-3, -2),
(-2, 0),
(1, 1),
Raise_Pen,
(1, 1),
(-3, 2),
(-5, 4),
(-5, 6),
(-4, 8),
(-2, 9),
(1, 9),
(3, 8),
(5, 6)));
Glyph_70 : aliased constant Glyph :=
(Number_Of_Vectors => 21,
Width => 22,
Height => 21,
Y_Offset => -5,
X_Offset => -11,
Vects => (Raise_Pen,
(-3, -4),
(-5, -3),
(-7, -1),
(-8, 2),
(-8, 5),
(-7, 7),
(-6, 8),
(-4, 9),
(-1, 9),
(2, 8),
(5, 6),
(7, 3),
(8, 0),
(8, -3),
(6, -5),
(4, -5),
(2, -3),
(0, 1),
(-2, 6),
(-5, 16)));
Glyph_71 : aliased constant Glyph :=
(Number_Of_Vectors => 17,
Width => 19,
Height => 21,
Y_Offset => -5,
X_Offset => -9,
Vects => (Raise_Pen,
(-8, -2),
(-6, -4),
(-4, -5),
(-3, -5),
(-1, -4),
(0, -3),
(1, 0),
(1, 4),
(0, 9),
Raise_Pen,
(8, -5),
(7, -2),
(6, 0),
(0, 9),
(-2, 13),
(-3, 16)));
Glyph_72 : aliased constant Glyph :=
(Number_Of_Vectors => 19,
Width => 20,
Height => 21,
Y_Offset => -5,
X_Offset => -10,
Vects => (Raise_Pen,
(-9, -1),
(-8, -3),
(-6, -5),
(-4, -5),
(-3, -4),
(-3, -2),
(-4, 2),
(-6, 9),
Raise_Pen,
(-4, 2),
(-2, -2),
(0, -4),
(2, -5),
(4, -5),
(6, -3),
(6, 0),
(5, 5),
(2, 16)));
Glyph_73 : aliased constant Glyph :=
(Number_Of_Vectors => 9,
Width => 11,
Height => 14,
Y_Offset => -5,
X_Offset => -6,
Vects => (Raise_Pen,
(0, -5),
(-2, 2),
(-3, 6),
(-3, 8),
(-2, 9),
(0, 9),
(2, 7),
(3, 5)));
Glyph_74 : aliased constant Glyph :=
(Number_Of_Vectors => 6,
Width => 22,
Height => 14,
Y_Offset => -7,
X_Offset => -11,
Vects => (Raise_Pen,
(-7, -7),
(7, 7),
Raise_Pen,
(7, -7),
(-7, 7)));
Glyph_75 : aliased constant Glyph :=
(Number_Of_Vectors => 19,
Width => 18,
Height => 14,
Y_Offset => -5,
X_Offset => -9,
Vects => (Raise_Pen,
(-3, -5),
(-7, 9),
Raise_Pen,
(7, -4),
(6, -5),
(5, -5),
(3, -4),
(-1, 0),
(-3, 1),
(-4, 1),
Raise_Pen,
(-4, 1),
(-2, 2),
(-1, 3),
(1, 8),
(2, 9),
(3, 9),
(4, 8)));
Glyph_76 : aliased constant Glyph :=
(Number_Of_Vectors => 9,
Width => 16,
Height => 21,
Y_Offset => -12,
X_Offset => -8,
Vects => (Raise_Pen,
(-7, -12),
(-5, -12),
(-3, -11),
(-2, -10),
(6, 9),
Raise_Pen,
(0, -5),
(-6, 9)));
Glyph_77 : aliased constant Glyph :=
(Number_Of_Vectors => 21,
Width => 21,
Height => 21,
Y_Offset => -5,
X_Offset => -10,
Vects => (Raise_Pen,
(-3, -5),
(-9, 16),
Raise_Pen,
(-4, -1),
(-5, 4),
(-5, 7),
(-3, 9),
(-1, 9),
(1, 8),
(3, 6),
(5, 2),
Raise_Pen,
(7, -5),
(5, 2),
(4, 6),
(4, 8),
(5, 9),
(7, 9),
(9, 7),
(10, 5)));
Glyph_78 : aliased constant Glyph :=
(Number_Of_Vectors => 14,
Width => 18,
Height => 14,
Y_Offset => -5,
X_Offset => -9,
Vects => (Raise_Pen,
(-6, -5),
(-3, -5),
(-4, 1),
(-5, 6),
(-6, 9),
Raise_Pen,
(7, -5),
(6, -2),
(5, 0),
(3, 3),
(0, 6),
(-3, 8),
(-6, 9)));
Glyph_79 : aliased constant Glyph :=
(Number_Of_Vectors => 18,
Width => 17,
Height => 14,
Y_Offset => -5,
X_Offset => -8,
Vects => (Raise_Pen,
(0, -5),
(-2, -4),
(-4, -2),
(-5, 1),
(-5, 4),
(-4, 7),
(-3, 8),
(-1, 9),
(1, 9),
(3, 8),
(5, 6),
(6, 3),
(6, 0),
(5, -3),
(4, -4),
(2, -5),
(0, -5)));
Glyph_80 : aliased constant Glyph :=
(Number_Of_Vectors => 13,
Width => 22,
Height => 14,
Y_Offset => -5,
X_Offset => -11,
Vects => (Raise_Pen,
(-2, -5),
(-6, 9),
Raise_Pen,
(3, -5),
(4, 1),
(5, 6),
(6, 9),
Raise_Pen,
(-9, -2),
(-7, -4),
(-4, -5),
(9, -5)));
Glyph_81 : aliased constant Glyph :=
(Number_Of_Vectors => 27,
Width => 21,
Height => 21,
Y_Offset => -12,
X_Offset => -11,
Vects => (Raise_Pen,
(-10, -1),
(-9, -3),
(-7, -5),
(-5, -5),
(-4, -4),
(-4, -2),
(-5, 3),
(-5, 6),
(-4, 8),
(-3, 9),
(-1, 9),
(1, 8),
(3, 5),
(4, 3),
(5, 0),
(6, -5),
(6, -8),
(5, -11),
(3, -12),
(1, -12),
(0, -10),
(0, -8),
(1, -5),
(3, -2),
(5, 0),
(8, 2)));
Glyph_82 : aliased constant Glyph :=
(Number_Of_Vectors => 19,
Width => 18,
Height => 21,
Y_Offset => -5,
X_Offset => -9,
Vects => (Raise_Pen,
(-5, 1),
(-5, 4),
(-4, 7),
(-3, 8),
(-1, 9),
(1, 9),
(3, 8),
(5, 6),
(6, 3),
(6, 0),
(5, -3),
(4, -4),
(2, -5),
(0, -5),
(-2, -4),
(-4, -2),
(-5, 1),
(-9, 16)));
Glyph_83 : aliased constant Glyph :=
(Number_Of_Vectors => 18,
Width => 20,
Height => 14,
Y_Offset => -5,
X_Offset => -9,
Vects => (Raise_Pen,
(9, -5),
(-1, -5),
(-3, -4),
(-5, -2),
(-6, 1),
(-6, 4),
(-5, 7),
(-4, 8),
(-2, 9),
(0, 9),
(2, 8),
(4, 6),
(5, 3),
(5, 0),
(4, -3),
(3, -4),
(1, -5)));
Glyph_84 : aliased constant Glyph :=
(Number_Of_Vectors => 8,
Width => 20,
Height => 14,
Y_Offset => -5,
X_Offset => -10,
Vects => (Raise_Pen,
(1, -5),
(-2, 9),
Raise_Pen,
(-8, -2),
(-6, -4),
(-3, -5),
(8, -5)));
Glyph_85 : aliased constant Glyph :=
(Number_Of_Vectors => 16,
Width => 20,
Height => 14,
Y_Offset => -5,
X_Offset => -10,
Vects => (Raise_Pen,
(-9, -1),
(-8, -3),
(-6, -5),
(-4, -5),
(-3, -4),
(-3, -2),
(-5, 4),
(-5, 7),
(-3, 9),
(-1, 9),
(2, 8),
(4, 6),
(6, 2),
(7, -2),
(7, -5)));
Glyph_86 : aliased constant Glyph :=
(Number_Of_Vectors => 15,
Width => 26,
Height => 18,
Y_Offset => -9,
X_Offset => -13,
Vects => (Raise_Pen,
(0, -9),
(-1, -8),
(0, -7),
(1, -8),
(0, -9),
Raise_Pen,
(-9, 0),
(9, 0),
Raise_Pen,
(0, 7),
(-1, 8),
(0, 9),
(1, 8),
(0, 7)));
Glyph_87 : aliased constant Glyph :=
(Number_Of_Vectors => 23,
Width => 23,
Height => 14,
Y_Offset => -5,
X_Offset => -12,
Vects => (Raise_Pen,
(-4, -5),
(-6, -4),
(-8, -1),
(-9, 2),
(-9, 5),
(-8, 8),
(-7, 9),
(-5, 9),
(-3, 8),
(-1, 5),
Raise_Pen,
(0, 1),
(-1, 5),
(0, 8),
(1, 9),
(3, 9),
(5, 8),
(7, 5),
(8, 2),
(8, -1),
(7, -4),
(6, -5)));
Glyph_88 : aliased constant Glyph :=
(Number_Of_Vectors => 29,
Width => 16,
Height => 28,
Y_Offset => -12,
X_Offset => -8,
Vects => (Raise_Pen,
(2, -12),
(0, -11),
(-1, -10),
(-1, -9),
(0, -8),
(3, -7),
(6, -7),
Raise_Pen,
(3, -7),
(0, -6),
(-2, -5),
(-3, -3),
(-3, -1),
(-1, 1),
(2, 2),
(4, 2),
Raise_Pen,
(2, 2),
(-2, 3),
(-4, 4),
(-5, 6),
(-5, 8),
(-3, 10),
(1, 12),
(2, 13),
(2, 15),
(0, 16),
(-2, 16)));
Glyph_89 : aliased constant Glyph :=
(Number_Of_Vectors => 20,
Width => 23,
Height => 28,
Y_Offset => -12,
X_Offset => -12,
Vects => (Raise_Pen,
(4, -12),
(-4, 16),
Raise_Pen,
(-11, -1),
(-10, -3),
(-8, -5),
(-6, -5),
(-5, -4),
(-5, -2),
(-6, 3),
(-6, 6),
(-5, 8),
(-3, 9),
(-1, 9),
(2, 8),
(4, 6),
(6, 3),
(8, -2),
(9, -5)));
Glyph_90 : aliased constant Glyph :=
(Number_Of_Vectors => 23,
Width => 15,
Height => 28,
Y_Offset => -12,
X_Offset => -8,
Vects => (Raise_Pen,
(2, -12),
(0, -11),
(-1, -10),
(-1, -9),
(0, -8),
(3, -7),
(6, -7),
Raise_Pen,
(6, -7),
(2, -5),
(-1, -3),
(-4, 0),
(-5, 3),
(-5, 5),
(-4, 7),
(-2, 9),
(1, 11),
(2, 13),
(2, 15),
(1, 16),
(-1, 16),
(-2, 14)));
Glyph_91 : aliased constant Glyph :=
(Number_Of_Vectors => 40,
Width => 14,
Height => 32,
Y_Offset => -16,
X_Offset => -7,
Vects => (Raise_Pen,
(2, -16),
(0, -15),
(-1, -14),
(-2, -12),
(-2, -10),
(-1, -8),
(0, -7),
(1, -5),
(1, -3),
(-1, -1),
Raise_Pen,
(0, -15),
(-1, -13),
(-1, -11),
(0, -9),
(1, -8),
(2, -6),
(2, -4),
(1, -2),
(-3, 0),
(1, 2),
(2, 4),
(2, 6),
(1, 8),
(0, 9),
(-1, 11),
(-1, 13),
(0, 15),
Raise_Pen,
(-1, 1),
(1, 3),
(1, 5),
(0, 7),
(-1, 8),
(-2, 10),
(-2, 12),
(-1, 14),
(0, 15),
(2, 16)));
Glyph_92 : aliased constant Glyph :=
(Number_Of_Vectors => 3,
Width => 8,
Height => 32,
Y_Offset => -16,
X_Offset => -4,
Vects => (Raise_Pen,
(0, -16),
(0, 16)));
Glyph_93 : aliased constant Glyph :=
(Number_Of_Vectors => 40,
Width => 14,
Height => 32,
Y_Offset => -16,
X_Offset => -7,
Vects => (Raise_Pen,
(-2, -16),
(0, -15),
(1, -14),
(2, -12),
(2, -10),
(1, -8),
(0, -7),
(-1, -5),
(-1, -3),
(1, -1),
Raise_Pen,
(0, -15),
(1, -13),
(1, -11),
(0, -9),
(-1, -8),
(-2, -6),
(-2, -4),
(-1, -2),
(3, 0),
(-1, 2),
(-2, 4),
(-2, 6),
(-1, 8),
(0, 9),
(1, 11),
(1, 13),
(0, 15),
Raise_Pen,
(1, 1),
(-1, 3),
(-1, 5),
(0, 7),
(1, 8),
(2, 10),
(2, 12),
(1, 14),
(0, 15),
(-2, 16)));
Glyph_94 : aliased constant Glyph :=
(Number_Of_Vectors => 24,
Width => 24,
Height => 6,
Y_Offset => -3,
X_Offset => -12,
Vects => (Raise_Pen,
(-9, 3),
(-9, 1),
(-8, -2),
(-6, -3),
(-4, -3),
(-2, -2),
(2, 1),
(4, 2),
(6, 2),
(8, 1),
(9, -1),
Raise_Pen,
(-9, 1),
(-8, -1),
(-6, -2),
(-4, -2),
(-2, -1),
(2, 2),
(4, 3),
(6, 3),
(8, 2),
(9, -1),
(9, -3)));
Glyph_95 : aliased constant Glyph :=
(Number_Of_Vectors => 35,
Width => 16,
Height => 21,
Y_Offset => -12,
X_Offset => -8,
Vects => (Raise_Pen,
(-8, -12),
(-8, 9),
(-7, 9),
(-7, -12),
(-6, -12),
(-6, 9),
(-5, 9),
(-5, -12),
(-4, -12),
(-4, 9),
(-3, 9),
(-3, -12),
(-2, -12),
(-2, 9),
(-1, 9),
(-1, -12),
(0, -12),
(0, 9),
(1, 9),
(1, -12),
(2, -12),
(2, 9),
(3, 9),
(3, -12),
(4, -12),
(4, 9),
(5, 9),
(5, -12),
(6, -12),
(6, 9),
(7, 9),
(7, -12),
(8, -12),
(8, 9)));
Font_D : aliased constant Hershey_Font :=
(Number_Of_Glyphs => 96,
Glyphs =>
(
Glyph_0'Access,
Glyph_1'Access,
Glyph_2'Access,
Glyph_3'Access,
Glyph_4'Access,
Glyph_5'Access,
Glyph_6'Access,
Glyph_7'Access,
Glyph_8'Access,
Glyph_9'Access,
Glyph_10'Access,
Glyph_11'Access,
Glyph_12'Access,
Glyph_13'Access,
Glyph_14'Access,
Glyph_15'Access,
Glyph_16'Access,
Glyph_17'Access,
Glyph_18'Access,
Glyph_19'Access,
Glyph_20'Access,
Glyph_21'Access,
Glyph_22'Access,
Glyph_23'Access,
Glyph_24'Access,
Glyph_25'Access,
Glyph_26'Access,
Glyph_27'Access,
Glyph_28'Access,
Glyph_29'Access,
Glyph_30'Access,
Glyph_31'Access,
Glyph_32'Access,
Glyph_33'Access,
Glyph_34'Access,
Glyph_35'Access,
Glyph_36'Access,
Glyph_37'Access,
Glyph_38'Access,
Glyph_39'Access,
Glyph_40'Access,
Glyph_41'Access,
Glyph_42'Access,
Glyph_43'Access,
Glyph_44'Access,
Glyph_45'Access,
Glyph_46'Access,
Glyph_47'Access,
Glyph_48'Access,
Glyph_49'Access,
Glyph_50'Access,
Glyph_51'Access,
Glyph_52'Access,
Glyph_53'Access,
Glyph_54'Access,
Glyph_55'Access,
Glyph_56'Access,
Glyph_57'Access,
Glyph_58'Access,
Glyph_59'Access,
Glyph_60'Access,
Glyph_61'Access,
Glyph_62'Access,
Glyph_63'Access,
Glyph_64'Access,
Glyph_65'Access,
Glyph_66'Access,
Glyph_67'Access,
Glyph_68'Access,
Glyph_69'Access,
Glyph_70'Access,
Glyph_71'Access,
Glyph_72'Access,
Glyph_73'Access,
Glyph_74'Access,
Glyph_75'Access,
Glyph_76'Access,
Glyph_77'Access,
Glyph_78'Access,
Glyph_79'Access,
Glyph_80'Access,
Glyph_81'Access,
Glyph_82'Access,
Glyph_83'Access,
Glyph_84'Access,
Glyph_85'Access,
Glyph_86'Access,
Glyph_87'Access,
Glyph_88'Access,
Glyph_89'Access,
Glyph_90'Access,
Glyph_91'Access,
Glyph_92'Access,
Glyph_93'Access,
Glyph_94'Access,
Glyph_95'Access
), Y_Advance => 32);
Font : constant Giza.Font.Ref_Const := Font_D'Access;
end Giza.Hershey_Fonts.Greek;
| 15.507996 | 56 | 0.432393 |
9a5730eb7dbc44bc0a9438a864d10fa18fe5d839 | 882 | adb | Ada | courses/fundamentals_of_ada/labs/prompts/120_limited_types/timecards.adb | AdaCore/training_material | 6651eb2c53f8c39649b8e0b3c757bc8ff963025a | [
"CC-BY-4.0"
] | 15 | 2020-10-07T08:56:45.000Z | 2022-02-08T23:13:22.000Z | courses/fundamentals_of_ada/labs/prompts/120_limited_types/timecards.adb | AdaCore/training_material | 6651eb2c53f8c39649b8e0b3c757bc8ff963025a | [
"CC-BY-4.0"
] | 20 | 2020-11-05T14:35:20.000Z | 2022-01-13T15:59:33.000Z | courses/fundamentals_of_ada/labs/prompts/120_limited_types/timecards.adb | AdaCore/training_material | 6651eb2c53f8c39649b8e0b3c757bc8ff963025a | [
"CC-BY-4.0"
] | 6 | 2020-10-08T15:57:06.000Z | 2021-08-31T12:03:08.000Z | package body Timecards is
function Create
(Name : String;
Rate : Employee_Data.Hourly_Rate_T;
Hours : Hours_Worked_T)
return Timecard_T is
begin
return Timecard_T'(others => <>);
end Create;
function Id
(Timecard : Timecard_T)
return Employee_Data.Id_T is
begin
return Employee_Data.Id_T'first;
end Id;
function Name
(Timecard : Timecard_T)
return String is
begin
return "";
end Name;
function Rate
(Timecard : Timecard_T)
return Employee_Data.Hourly_Rate_T is
begin
return Employee_Data.Hourly_Rate_T'first;
end Rate;
function Pay
(Timecard : Timecard_T)
return Pay_T is
begin
return Pay_T'first;
end Pay;
function Image
(Timecard : Timecard_T)
return String is
begin
return "";
end Image;
end Timecards;
| 18.765957 | 47 | 0.634921 |
1e279b4c245825953bb30addaad1cbf62eea86fd | 4,089 | adb | Ada | src/ncurses-5.5/Ada95/src/terminal_interface-curses-forms-field_types-intfield.adb | erwinchang/minicom | 3fe2ba7d8e8475c199b493a2b99cd3c690f6ea4f | [
"MIT"
] | null | null | null | src/ncurses-5.5/Ada95/src/terminal_interface-curses-forms-field_types-intfield.adb | erwinchang/minicom | 3fe2ba7d8e8475c199b493a2b99cd3c690f6ea4f | [
"MIT"
] | null | null | null | src/ncurses-5.5/Ada95/src/terminal_interface-curses-forms-field_types-intfield.adb | erwinchang/minicom | 3fe2ba7d8e8475c199b493a2b99cd3c690f6ea4f | [
"MIT"
] | 3 | 2016-06-13T13:20:56.000Z | 2019-12-05T02:31:23.000Z | ------------------------------------------------------------------------------
-- --
-- GNAT ncurses Binding --
-- --
-- Terminal_Interface.Curses.Forms.Field_Types.IntField --
-- --
-- B O D Y --
-- --
------------------------------------------------------------------------------
-- Copyright (c) 1998 Free Software Foundation, Inc. --
-- --
-- Permission is hereby granted, free of charge, to any person obtaining a --
-- copy of this software and associated documentation files (the --
-- "Software"), to deal in the Software without restriction, including --
-- without limitation the rights to use, copy, modify, merge, publish, --
-- distribute, distribute with modifications, sublicense, and/or sell --
-- copies of the Software, and to permit persons to whom the Software is --
-- furnished to do so, subject to the following conditions: --
-- --
-- The above copyright notice and this permission notice shall be included --
-- in all copies or substantial portions of the Software. --
-- --
-- THE SOFTWARE IS PROVIDED "AS IS", WITHOUT WARRANTY OF ANY KIND, EXPRESS --
-- OR IMPLIED, INCLUDING BUT NOT LIMITED TO THE WARRANTIES OF --
-- MERCHANTABILITY, FITNESS FOR A PARTICULAR PURPOSE AND NONINFRINGEMENT. --
-- IN NO EVENT SHALL THE ABOVE COPYRIGHT HOLDERS BE LIABLE FOR ANY CLAIM, --
-- DAMAGES OR OTHER LIABILITY, WHETHER IN AN ACTION OF CONTRACT, TORT OR --
-- OTHERWISE, ARISING FROM, OUT OF OR IN CONNECTION WITH THE SOFTWARE OR --
-- THE USE OR OTHER DEALINGS IN THE SOFTWARE. --
-- --
-- Except as contained in this notice, the name(s) of the above copyright --
-- holders shall not be used in advertising or otherwise to promote the --
-- sale, use or other dealings in this Software without prior written --
-- authorization. --
------------------------------------------------------------------------------
-- Author: Juergen Pfeifer, 1996
-- Version Control:
-- $Revision: 1.8 $
-- Binding Version 01.00
------------------------------------------------------------------------------
with Interfaces.C;
with Terminal_Interface.Curses.Aux; use Terminal_Interface.Curses.Aux;
package body Terminal_Interface.Curses.Forms.Field_Types.IntField is
use type Interfaces.C.int;
procedure Set_Field_Type (Fld : in Field;
Typ : in Integer_Field)
is
C_Integer_Field_Type : C_Field_Type;
pragma Import (C, C_Integer_Field_Type, "TYPE_INTEGER");
function Set_Fld_Type (F : Field := Fld;
Cft : C_Field_Type := C_Integer_Field_Type;
Arg1 : C_Int;
Arg2 : C_Long_Int;
Arg3 : C_Long_Int) return C_Int;
pragma Import (C, Set_Fld_Type, "set_field_type");
Res : Eti_Error;
begin
Res := Set_Fld_Type (Arg1 => C_Int (Typ.Precision),
Arg2 => C_Long_Int (Typ.Lower_Limit),
Arg3 => C_Long_Int (Typ.Upper_Limit));
if Res /= E_Ok then
Eti_Exception (Res);
end if;
Wrap_Builtin (Fld, Typ);
end Set_Field_Type;
end Terminal_Interface.Curses.Forms.Field_Types.IntField;
| 56.013699 | 78 | 0.458058 |
3844fbdd3fcf6841aa6ebb58f85bb6ce5446fc48 | 2,416 | ads | Ada | source/regions/regions-shared_lists.ads | reznikmm/declarative-regions | 2e2072aaf5163b49891b24873d179ea61249dd70 | [
"MIT"
] | null | null | null | source/regions/regions-shared_lists.ads | reznikmm/declarative-regions | 2e2072aaf5163b49891b24873d179ea61249dd70 | [
"MIT"
] | null | null | null | source/regions/regions-shared_lists.ads | reznikmm/declarative-regions | 2e2072aaf5163b49891b24873d179ea61249dd70 | [
"MIT"
] | null | null | null | with Ada.Finalization;
with Ada.Iterator_Interfaces;
generic
type Element_Type is private;
with function "=" (Left, Right : Element_Type) return Boolean is <>;
with procedure Destroy (Value : in out Element_Type) is null;
package Regions.Shared_Lists is
pragma Preelaborate;
type List is tagged private
with
Constant_Indexing => Constant_Indexing,
Default_Iterator => Iterate,
Iterator_Element => Element_Type;
function "=" (Left, Right : List) return Boolean;
function Is_Empty (Self : List) return Boolean with Inline;
function Length (Self : List) return Natural with Inline;
function Empty_List return List with Inline;
function First_Element (Self : List) return Element_Type
with Pre => not Self.Is_Empty, Inline;
procedure Prepend
(Self : in out List;
Item : Element_Type) with Inline;
type Cursor is private;
function Has_Element (Self : Cursor) return Boolean with Inline;
-- Check if the cursor points to any element
package Iterator_Interfaces is new Ada.Iterator_Interfaces
(Cursor, Has_Element);
type Forward_Iterator is new Iterator_Interfaces.Forward_Iterator
with private;
function Iterate (Self : List'Class) return Forward_Iterator with Inline;
-- Iterate over all elements in the map
function Constant_Indexing
(Self : List;
Position : Cursor) return Element_Type
with Pre => Has_Element (Position), Inline;
No_Element : constant Cursor;
private
type List_Node;
type List_Node_Access is access all List_Node;
type List_Node is record
Next : List_Node_Access;
Counter : Natural;
Data : Element_Type;
end record;
type List is new Ada.Finalization.Controlled with record
Head : List_Node_Access;
Length : Natural := 0;
end record;
overriding procedure Adjust (Self : in out List);
overriding procedure Finalize (Self : in out List);
type Cursor is record
Item : List_Node_Access;
end record;
type Forward_Iterator is new Iterator_Interfaces.Forward_Iterator
with record
First : Cursor;
end record;
overriding function First (Self : Forward_Iterator) return Cursor;
overriding function Next
(Self : Forward_Iterator;
Position : Cursor) return Cursor;
No_Element : constant Cursor := (Item => null);
end Regions.Shared_Lists;
| 26.844444 | 76 | 0.705712 |
2eb2d522231d85e4d09ef2c3ef5b6027e85967a8 | 979 | ads | Ada | regtests/search-testsuite.ads | stcarrez/ada-search | 286dda8fbdd7fb0cd5e447347f92a77e34615089 | [
"Apache-2.0"
] | 9 | 2020-06-28T11:00:30.000Z | 2021-11-30T21:38:58.000Z | regtests/search-testsuite.ads | stcarrez/ada-search | 286dda8fbdd7fb0cd5e447347f92a77e34615089 | [
"Apache-2.0"
] | null | null | null | regtests/search-testsuite.ads | stcarrez/ada-search | 286dda8fbdd7fb0cd5e447347f92a77e34615089 | [
"Apache-2.0"
] | null | null | null | -----------------------------------------------------------------------
-- search-testsuite -- Testsuite for search
-- Copyright (C) 2020 Stephane Carrez
-- Written by Stephane Carrez ([email protected])
--
-- Licensed under the Apache License, Version 2.0 (the "License");
-- you may not use this file except in compliance with the License.
-- You may obtain a copy of the License at
--
-- http://www.apache.org/licenses/LICENSE-2.0
--
-- Unless required by applicable law or agreed to in writing, software
-- distributed under the License is distributed on an "AS IS" BASIS,
-- WITHOUT WARRANTIES OR CONDITIONS OF ANY KIND, either express or implied.
-- See the License for the specific language governing permissions and
-- limitations under the License.
-----------------------------------------------------------------------
with Util.Tests;
package Search.Testsuite is
function Suite return Util.Tests.Access_Test_Suite;
end Search.Testsuite;
| 39.16 | 76 | 0.635342 |
2e20d92e51c4ac040d743f13f45cf52c60ec882a | 18,713 | ads | Ada | rts/gcc-9/adainclude/a-chlat1.ads | letsbyteit/build-avr-ada-toolchain | 7c5dddbc69e6e2df8c30971417dc50d2f2b29794 | [
"MIT"
] | 7 | 2019-09-17T20:54:13.000Z | 2021-12-20T04:31:40.000Z | rts/gcc-9/adainclude/a-chlat1.ads | letsbyteit/build-avr-ada-toolchain | 7c5dddbc69e6e2df8c30971417dc50d2f2b29794 | [
"MIT"
] | 15 | 2021-04-09T20:13:33.000Z | 2021-12-22T01:03:59.000Z | rts/gcc-9/adainclude/a-chlat1.ads | letsbyteit/build-avr-ada-toolchain | 7c5dddbc69e6e2df8c30971417dc50d2f2b29794 | [
"MIT"
] | 8 | 2019-07-09T09:18:51.000Z | 2022-01-15T20:28:50.000Z | ------------------------------------------------------------------------------
-- --
-- GNAT RUN-TIME COMPONENTS --
-- --
-- A D A . C H A R A C T E R S . L A T I N _ 1 --
-- --
-- S p e c --
-- --
-- This specification is derived from the Ada Reference Manual for use with --
-- GNAT. In accordance with the copyright of that document, you can freely --
-- copy and modify this specification, provided that if you redistribute a --
-- modified version, any changes that you have made are clearly indicated. --
-- --
------------------------------------------------------------------------------
pragma Compiler_Unit_Warning;
package Ada.Characters.Latin_1 is
pragma Pure;
------------------------
-- Control Characters --
------------------------
NUL : constant Character := Character'Val (0);
SOH : constant Character := Character'Val (1);
STX : constant Character := Character'Val (2);
ETX : constant Character := Character'Val (3);
EOT : constant Character := Character'Val (4);
ENQ : constant Character := Character'Val (5);
ACK : constant Character := Character'Val (6);
BEL : constant Character := Character'Val (7);
BS : constant Character := Character'Val (8);
HT : constant Character := Character'Val (9);
LF : constant Character := Character'Val (10);
VT : constant Character := Character'Val (11);
FF : constant Character := Character'Val (12);
CR : constant Character := Character'Val (13);
SO : constant Character := Character'Val (14);
SI : constant Character := Character'Val (15);
DLE : constant Character := Character'Val (16);
DC1 : constant Character := Character'Val (17);
DC2 : constant Character := Character'Val (18);
DC3 : constant Character := Character'Val (19);
DC4 : constant Character := Character'Val (20);
NAK : constant Character := Character'Val (21);
SYN : constant Character := Character'Val (22);
ETB : constant Character := Character'Val (23);
CAN : constant Character := Character'Val (24);
EM : constant Character := Character'Val (25);
SUB : constant Character := Character'Val (26);
ESC : constant Character := Character'Val (27);
FS : constant Character := Character'Val (28);
GS : constant Character := Character'Val (29);
RS : constant Character := Character'Val (30);
US : constant Character := Character'Val (31);
--------------------------------
-- ISO 646 Graphic Characters --
--------------------------------
Space : constant Character := ' '; -- Character'Val(32)
Exclamation : constant Character := '!'; -- Character'Val(33)
Quotation : constant Character := '"'; -- Character'Val(34)
Number_Sign : constant Character := '#'; -- Character'Val(35)
Dollar_Sign : constant Character := '$'; -- Character'Val(36)
Percent_Sign : constant Character := '%'; -- Character'Val(37)
Ampersand : constant Character := '&'; -- Character'Val(38)
Apostrophe : constant Character := '''; -- Character'Val(39)
Left_Parenthesis : constant Character := '('; -- Character'Val(40)
Right_Parenthesis : constant Character := ')'; -- Character'Val(41)
Asterisk : constant Character := '*'; -- Character'Val(42)
Plus_Sign : constant Character := '+'; -- Character'Val(43)
Comma : constant Character := ','; -- Character'Val(44)
Hyphen : constant Character := '-'; -- Character'Val(45)
Minus_Sign : Character renames Hyphen;
Full_Stop : constant Character := '.'; -- Character'Val(46)
Solidus : constant Character := '/'; -- Character'Val(47)
-- Decimal digits '0' though '9' are at positions 48 through 57
Colon : constant Character := ':'; -- Character'Val(58)
Semicolon : constant Character := ';'; -- Character'Val(59)
Less_Than_Sign : constant Character := '<'; -- Character'Val(60)
Equals_Sign : constant Character := '='; -- Character'Val(61)
Greater_Than_Sign : constant Character := '>'; -- Character'Val(62)
Question : constant Character := '?'; -- Character'Val(63)
Commercial_At : constant Character := '@'; -- Character'Val(64)
-- Letters 'A' through 'Z' are at positions 65 through 90
Left_Square_Bracket : constant Character := '['; -- Character'Val (91)
Reverse_Solidus : constant Character := '\'; -- Character'Val (92)
Right_Square_Bracket : constant Character := ']'; -- Character'Val (93)
Circumflex : constant Character := '^'; -- Character'Val (94)
Low_Line : constant Character := '_'; -- Character'Val (95)
Grave : constant Character := '`'; -- Character'Val (96)
LC_A : constant Character := 'a'; -- Character'Val (97)
LC_B : constant Character := 'b'; -- Character'Val (98)
LC_C : constant Character := 'c'; -- Character'Val (99)
LC_D : constant Character := 'd'; -- Character'Val (100)
LC_E : constant Character := 'e'; -- Character'Val (101)
LC_F : constant Character := 'f'; -- Character'Val (102)
LC_G : constant Character := 'g'; -- Character'Val (103)
LC_H : constant Character := 'h'; -- Character'Val (104)
LC_I : constant Character := 'i'; -- Character'Val (105)
LC_J : constant Character := 'j'; -- Character'Val (106)
LC_K : constant Character := 'k'; -- Character'Val (107)
LC_L : constant Character := 'l'; -- Character'Val (108)
LC_M : constant Character := 'm'; -- Character'Val (109)
LC_N : constant Character := 'n'; -- Character'Val (110)
LC_O : constant Character := 'o'; -- Character'Val (111)
LC_P : constant Character := 'p'; -- Character'Val (112)
LC_Q : constant Character := 'q'; -- Character'Val (113)
LC_R : constant Character := 'r'; -- Character'Val (114)
LC_S : constant Character := 's'; -- Character'Val (115)
LC_T : constant Character := 't'; -- Character'Val (116)
LC_U : constant Character := 'u'; -- Character'Val (117)
LC_V : constant Character := 'v'; -- Character'Val (118)
LC_W : constant Character := 'w'; -- Character'Val (119)
LC_X : constant Character := 'x'; -- Character'Val (120)
LC_Y : constant Character := 'y'; -- Character'Val (121)
LC_Z : constant Character := 'z'; -- Character'Val (122)
Left_Curly_Bracket : constant Character := '{'; -- Character'Val (123)
Vertical_Line : constant Character := '|'; -- Character'Val (124)
Right_Curly_Bracket : constant Character := '}'; -- Character'Val (125)
Tilde : constant Character := '~'; -- Character'Val (126)
DEL : constant Character := Character'Val (127);
---------------------------------
-- ISO 6429 Control Characters --
---------------------------------
IS4 : Character renames FS;
IS3 : Character renames GS;
IS2 : Character renames RS;
IS1 : Character renames US;
Reserved_128 : constant Character := Character'Val (128);
Reserved_129 : constant Character := Character'Val (129);
BPH : constant Character := Character'Val (130);
NBH : constant Character := Character'Val (131);
Reserved_132 : constant Character := Character'Val (132);
NEL : constant Character := Character'Val (133);
SSA : constant Character := Character'Val (134);
ESA : constant Character := Character'Val (135);
HTS : constant Character := Character'Val (136);
HTJ : constant Character := Character'Val (137);
VTS : constant Character := Character'Val (138);
PLD : constant Character := Character'Val (139);
PLU : constant Character := Character'Val (140);
RI : constant Character := Character'Val (141);
SS2 : constant Character := Character'Val (142);
SS3 : constant Character := Character'Val (143);
DCS : constant Character := Character'Val (144);
PU1 : constant Character := Character'Val (145);
PU2 : constant Character := Character'Val (146);
STS : constant Character := Character'Val (147);
CCH : constant Character := Character'Val (148);
MW : constant Character := Character'Val (149);
SPA : constant Character := Character'Val (150);
EPA : constant Character := Character'Val (151);
SOS : constant Character := Character'Val (152);
Reserved_153 : constant Character := Character'Val (153);
SCI : constant Character := Character'Val (154);
CSI : constant Character := Character'Val (155);
ST : constant Character := Character'Val (156);
OSC : constant Character := Character'Val (157);
PM : constant Character := Character'Val (158);
APC : constant Character := Character'Val (159);
------------------------------
-- Other Graphic Characters --
------------------------------
-- Character positions 160 (16#A0#) .. 175 (16#AF#)
No_Break_Space : constant Character := Character'Val (160);
NBSP : Character renames No_Break_Space;
Inverted_Exclamation : constant Character := Character'Val (161);
Cent_Sign : constant Character := Character'Val (162);
Pound_Sign : constant Character := Character'Val (163);
Currency_Sign : constant Character := Character'Val (164);
Yen_Sign : constant Character := Character'Val (165);
Broken_Bar : constant Character := Character'Val (166);
Section_Sign : constant Character := Character'Val (167);
Diaeresis : constant Character := Character'Val (168);
Copyright_Sign : constant Character := Character'Val (169);
Feminine_Ordinal_Indicator : constant Character := Character'Val (170);
Left_Angle_Quotation : constant Character := Character'Val (171);
Not_Sign : constant Character := Character'Val (172);
Soft_Hyphen : constant Character := Character'Val (173);
Registered_Trade_Mark_Sign : constant Character := Character'Val (174);
Macron : constant Character := Character'Val (175);
-- Character positions 176 (16#B0#) .. 191 (16#BF#)
Degree_Sign : constant Character := Character'Val (176);
Ring_Above : Character renames Degree_Sign;
Plus_Minus_Sign : constant Character := Character'Val (177);
Superscript_Two : constant Character := Character'Val (178);
Superscript_Three : constant Character := Character'Val (179);
Acute : constant Character := Character'Val (180);
Micro_Sign : constant Character := Character'Val (181);
Pilcrow_Sign : constant Character := Character'Val (182);
Paragraph_Sign : Character renames Pilcrow_Sign;
Middle_Dot : constant Character := Character'Val (183);
Cedilla : constant Character := Character'Val (184);
Superscript_One : constant Character := Character'Val (185);
Masculine_Ordinal_Indicator : constant Character := Character'Val (186);
Right_Angle_Quotation : constant Character := Character'Val (187);
Fraction_One_Quarter : constant Character := Character'Val (188);
Fraction_One_Half : constant Character := Character'Val (189);
Fraction_Three_Quarters : constant Character := Character'Val (190);
Inverted_Question : constant Character := Character'Val (191);
-- Character positions 192 (16#C0#) .. 207 (16#CF#)
UC_A_Grave : constant Character := Character'Val (192);
UC_A_Acute : constant Character := Character'Val (193);
UC_A_Circumflex : constant Character := Character'Val (194);
UC_A_Tilde : constant Character := Character'Val (195);
UC_A_Diaeresis : constant Character := Character'Val (196);
UC_A_Ring : constant Character := Character'Val (197);
UC_AE_Diphthong : constant Character := Character'Val (198);
UC_C_Cedilla : constant Character := Character'Val (199);
UC_E_Grave : constant Character := Character'Val (200);
UC_E_Acute : constant Character := Character'Val (201);
UC_E_Circumflex : constant Character := Character'Val (202);
UC_E_Diaeresis : constant Character := Character'Val (203);
UC_I_Grave : constant Character := Character'Val (204);
UC_I_Acute : constant Character := Character'Val (205);
UC_I_Circumflex : constant Character := Character'Val (206);
UC_I_Diaeresis : constant Character := Character'Val (207);
-- Character positions 208 (16#D0#) .. 223 (16#DF#)
UC_Icelandic_Eth : constant Character := Character'Val (208);
UC_N_Tilde : constant Character := Character'Val (209);
UC_O_Grave : constant Character := Character'Val (210);
UC_O_Acute : constant Character := Character'Val (211);
UC_O_Circumflex : constant Character := Character'Val (212);
UC_O_Tilde : constant Character := Character'Val (213);
UC_O_Diaeresis : constant Character := Character'Val (214);
Multiplication_Sign : constant Character := Character'Val (215);
UC_O_Oblique_Stroke : constant Character := Character'Val (216);
UC_U_Grave : constant Character := Character'Val (217);
UC_U_Acute : constant Character := Character'Val (218);
UC_U_Circumflex : constant Character := Character'Val (219);
UC_U_Diaeresis : constant Character := Character'Val (220);
UC_Y_Acute : constant Character := Character'Val (221);
UC_Icelandic_Thorn : constant Character := Character'Val (222);
LC_German_Sharp_S : constant Character := Character'Val (223);
-- Character positions 224 (16#E0#) .. 239 (16#EF#)
LC_A_Grave : constant Character := Character'Val (224);
LC_A_Acute : constant Character := Character'Val (225);
LC_A_Circumflex : constant Character := Character'Val (226);
LC_A_Tilde : constant Character := Character'Val (227);
LC_A_Diaeresis : constant Character := Character'Val (228);
LC_A_Ring : constant Character := Character'Val (229);
LC_AE_Diphthong : constant Character := Character'Val (230);
LC_C_Cedilla : constant Character := Character'Val (231);
LC_E_Grave : constant Character := Character'Val (232);
LC_E_Acute : constant Character := Character'Val (233);
LC_E_Circumflex : constant Character := Character'Val (234);
LC_E_Diaeresis : constant Character := Character'Val (235);
LC_I_Grave : constant Character := Character'Val (236);
LC_I_Acute : constant Character := Character'Val (237);
LC_I_Circumflex : constant Character := Character'Val (238);
LC_I_Diaeresis : constant Character := Character'Val (239);
-- Character positions 240 (16#F0#) .. 255 (16#FF)
LC_Icelandic_Eth : constant Character := Character'Val (240);
LC_N_Tilde : constant Character := Character'Val (241);
LC_O_Grave : constant Character := Character'Val (242);
LC_O_Acute : constant Character := Character'Val (243);
LC_O_Circumflex : constant Character := Character'Val (244);
LC_O_Tilde : constant Character := Character'Val (245);
LC_O_Diaeresis : constant Character := Character'Val (246);
Division_Sign : constant Character := Character'Val (247);
LC_O_Oblique_Stroke : constant Character := Character'Val (248);
LC_U_Grave : constant Character := Character'Val (249);
LC_U_Acute : constant Character := Character'Val (250);
LC_U_Circumflex : constant Character := Character'Val (251);
LC_U_Diaeresis : constant Character := Character'Val (252);
LC_Y_Acute : constant Character := Character'Val (253);
LC_Icelandic_Thorn : constant Character := Character'Val (254);
LC_Y_Diaeresis : constant Character := Character'Val (255);
end Ada.Characters.Latin_1;
| 63.006734 | 78 | 0.529578 |
4b170d495cd74cace05fd46b41d23539e62abfbd | 1,678 | ads | Ada | src/gen-commands-layout.ads | jquorning/dynamo | 10d68571476c270b8e45a9c5ef585fa9139b0d05 | [
"Apache-2.0"
] | 15 | 2015-01-18T23:04:19.000Z | 2022-03-01T20:27:08.000Z | src/gen-commands-layout.ads | jquorning/dynamo | 10d68571476c270b8e45a9c5ef585fa9139b0d05 | [
"Apache-2.0"
] | 16 | 2018-06-10T07:09:30.000Z | 2022-03-26T18:28:40.000Z | src/gen-commands-layout.ads | jquorning/dynamo | 10d68571476c270b8e45a9c5ef585fa9139b0d05 | [
"Apache-2.0"
] | 3 | 2015-11-11T18:00:14.000Z | 2022-01-30T23:08:45.000Z | -----------------------------------------------------------------------
-- gen-commands-layout -- Layout creation command for dynamo
-- Copyright (C) 2011, 2017, 2018, 2019 Stephane Carrez
-- Written by Stephane Carrez ([email protected])
--
-- Licensed under the Apache License, Version 2.0 (the "License");
-- you may not use this file except in compliance with the License.
-- You may obtain a copy of the License at
--
-- http://www.apache.org/licenses/LICENSE-2.0
--
-- Unless required by applicable law or agreed to in writing, software
-- distributed under the License is distributed on an "AS IS" BASIS,
-- WITHOUT WARRANTIES OR CONDITIONS OF ANY KIND, either express or implied.
-- See the License for the specific language governing permissions and
-- limitations under the License.
-----------------------------------------------------------------------
package Gen.Commands.Layout is
-- ------------------------------
-- Layout Creation Command
-- ------------------------------
-- This command adds a XHTML layout to the web application.
type Command is new Gen.Commands.Command with null record;
-- Execute the command with the arguments.
overriding
procedure Execute (Cmd : in out Command;
Name : in String;
Args : in Argument_List'Class;
Generator : in out Gen.Generator.Handler);
-- Write the help associated with the command.
overriding
procedure Help (Cmd : in out Command;
Name : in String;
Generator : in out Gen.Generator.Handler);
end Gen.Commands.Layout;
| 40.926829 | 76 | 0.578665 |
4b5d10b571164ce6f91ec7089d98fcb67270876a | 3,635 | adb | Ada | Ada95/src/terminal_interface-curses-forms-field_types-ipv4_address.adb | neverware-mirrors/ncurses | 931939e0d2765af13962820e59cb6629df3ee638 | [
"X11"
] | 269 | 2015-03-01T21:34:42.000Z | 2022-03-30T23:07:18.000Z | Ada95/src/terminal_interface-curses-forms-field_types-ipv4_address.adb | neverware-mirrors/ncurses | 931939e0d2765af13962820e59cb6629df3ee638 | [
"X11"
] | 3 | 2020-10-09T15:00:37.000Z | 2020-10-09T15:05:19.000Z | Ada95/src/terminal_interface-curses-forms-field_types-ipv4_address.adb | neverware-mirrors/ncurses | 931939e0d2765af13962820e59cb6629df3ee638 | [
"X11"
] | 97 | 2016-04-25T06:22:54.000Z | 2022-03-30T23:07:19.000Z | ------------------------------------------------------------------------------
-- --
-- GNAT ncurses Binding --
-- --
-- Terminal_Interface.Curses.Forms.Field_Types.IPV4_Address --
-- --
-- B O D Y --
-- --
------------------------------------------------------------------------------
-- Copyright 2020 Thomas E. Dickey --
-- Copyright 1999-2011,2014 Free Software Foundation, Inc. --
-- --
-- Permission is hereby granted, free of charge, to any person obtaining a --
-- copy of this software and associated documentation files (the --
-- "Software"), to deal in the Software without restriction, including --
-- without limitation the rights to use, copy, modify, merge, publish, --
-- distribute, distribute with modifications, sublicense, and/or sell --
-- copies of the Software, and to permit persons to whom the Software is --
-- furnished to do so, subject to the following conditions: --
-- --
-- The above copyright notice and this permission notice shall be included --
-- in all copies or substantial portions of the Software. --
-- --
-- THE SOFTWARE IS PROVIDED "AS IS", WITHOUT WARRANTY OF ANY KIND, EXPRESS --
-- OR IMPLIED, INCLUDING BUT NOT LIMITED TO THE WARRANTIES OF --
-- MERCHANTABILITY, FITNESS FOR A PARTICULAR PURPOSE AND NONINFRINGEMENT. --
-- IN NO EVENT SHALL THE ABOVE COPYRIGHT HOLDERS BE LIABLE FOR ANY CLAIM, --
-- DAMAGES OR OTHER LIABILITY, WHETHER IN AN ACTION OF CONTRACT, TORT OR --
-- OTHERWISE, ARISING FROM, OUT OF OR IN CONNECTION WITH THE SOFTWARE OR --
-- THE USE OR OTHER DEALINGS IN THE SOFTWARE. --
-- --
-- Except as contained in this notice, the name(s) of the above copyright --
-- holders shall not be used in advertising or otherwise to promote the --
-- sale, use or other dealings in this Software without prior written --
-- authorization. --
------------------------------------------------------------------------------
-- Author: Juergen Pfeifer, 1996
-- Version Control:
-- $Revision: 1.14 $
-- $Date: 2020/02/02 23:34:34 $
-- Binding Version 01.00
------------------------------------------------------------------------------
with Terminal_Interface.Curses.Aux; use Terminal_Interface.Curses.Aux;
package body Terminal_Interface.Curses.Forms.Field_Types.IPV4_Address is
procedure Set_Field_Type (Fld : Field;
Typ : Internet_V4_Address_Field)
is
function Set_Fld_Type (F : Field := Fld)
return Eti_Error;
pragma Import (C, Set_Fld_Type, "set_field_type_ipv4");
begin
Eti_Exception (Set_Fld_Type);
Wrap_Builtin (Fld, Typ);
end Set_Field_Type;
end Terminal_Interface.Curses.Forms.Field_Types.IPV4_Address;
| 60.583333 | 78 | 0.455571 |
Subsets and Splits