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
|
---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|---|
1855d39db81a2010e0f4b94a39ab980f8481ea6f | 6,299 | ads | Ada | examples/shared/common/gui/lcd_std_out.ads | shakram02/Ada_Drivers_Library | a407ca7ddbc2d9756647016c2f8fd8ef24a239ff | [
"BSD-3-Clause"
] | 192 | 2016-06-01T18:32:04.000Z | 2022-03-26T22:52:31.000Z | examples/shared/common/gui/lcd_std_out.ads | shakram02/Ada_Drivers_Library | a407ca7ddbc2d9756647016c2f8fd8ef24a239ff | [
"BSD-3-Clause"
] | 239 | 2016-05-26T20:02:01.000Z | 2022-03-31T09:46:56.000Z | examples/shared/common/gui/lcd_std_out.ads | shakram02/Ada_Drivers_Library | a407ca7ddbc2d9756647016c2f8fd8ef24a239ff | [
"BSD-3-Clause"
] | 142 | 2016-06-05T08:12:20.000Z | 2022-03-24T17:37:17.000Z | ------------------------------------------------------------------------------
-- --
-- Copyright (C) 2015-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. --
-- --
------------------------------------------------------------------------------
-- This package provides a set of convenience routines for putting characters
-- and strings out to the LCD.
with BMP_Fonts; use BMP_Fonts;
with HAL.Bitmap;
with HAL.Framebuffer;
package LCD_Std_Out is
Black : HAL.Bitmap.Bitmap_Color renames HAL.Bitmap.Black;
Blue : HAL.Bitmap.Bitmap_Color renames HAL.Bitmap.Blue;
Light_Blue : HAL.Bitmap.Bitmap_Color renames HAL.Bitmap.Light_Blue;
Green : HAL.Bitmap.Bitmap_Color renames HAL.Bitmap.Green;
Cyan : HAL.Bitmap.Bitmap_Color renames HAL.Bitmap.Cyan;
Gray : HAL.Bitmap.Bitmap_Color renames HAL.Bitmap.Gray;
Magenta : HAL.Bitmap.Bitmap_Color renames HAL.Bitmap.Magenta;
Light_Green : HAL.Bitmap.Bitmap_Color renames HAL.Bitmap.Light_Green;
Brown : HAL.Bitmap.Bitmap_Color renames HAL.Bitmap.Brown;
Red : HAL.Bitmap.Bitmap_Color renames HAL.Bitmap.Red;
Orange : HAL.Bitmap.Bitmap_Color renames HAL.Bitmap.Orange;
Yellow : HAL.Bitmap.Bitmap_Color renames HAL.Bitmap.Yellow;
White : HAL.Bitmap.Bitmap_Color renames HAL.Bitmap.White;
Default_Text_Color : constant HAL.Bitmap.Bitmap_Color := White;
Default_Background_Color : constant HAL.Bitmap.Bitmap_Color := Black;
Default_Font : constant BMP_Font := Font16x24;
-- Default_Orientation : constant LCD.Orientations := LCD.Portrait_2;
-- Changes to these current values will appear on subsequent calls to the
-- output routines.
Current_Text_Color : HAL.Bitmap.Bitmap_Color := Default_Text_Color;
Current_Background_Color : HAL.Bitmap.Bitmap_Color := Default_Background_Color;
procedure Set_Font (To : BMP_Font);
-- Changes the current font setting so that subsequent output is in the
-- specified font.
procedure Set_Orientation (To : HAL.Framebuffer.Display_Orientation);
-- Configures the screen orientation and fills the screen with the current
-- background color. All previously displayed content is lost.
procedure Clear_Screen;
----------------------------------------------------------------------------
-- These routines maintain a logical line and column, such that text will
-- wrap around to the next "line" when necessary, as determined by the
-- current orientation of the screen.
procedure Put_Line (Msg : String);
-- Note: wraps around to the next line if necessary.
-- Always calls procedure New_Line automatically after printing the string.
procedure Put (Msg : String);
-- Note: wraps around to the next line if necessary.
procedure Put (Msg : Character);
procedure New_Line;
-- A subsequent call to Put or Put_Line will start printing characters at
-- the beginning of the next line, wrapping around to the top of the LCD
-- screen if necessary.
----------------------------------------------------------------------------
-- These routines are provided for convenience, as an alternative to
-- using both this package and an instance of Bitmnapped_Drawing directly,
-- when wanting both the wrap-around semantics and direct X/Y coordinate
-- control. You can combine calls to these routines with the ones above but
-- these do not update the logical line/column state, so more likely you
-- will use one set or the other. If you only need X/Y coordinate control,
-- consider directly using an instance of HAL.Bitmap.
procedure Put (X, Y : Natural; Msg : Character);
-- Prints the character at the specified location. Has no other effect
-- whatsoever, especially none on the state of the current logical line
-- or logical column.
procedure Put (X, Y : Natural; Msg : String);
-- Prints the string, starting at the specified location. Has no other
-- effect whatsoever, especially none on the state of the current logical
-- line or logical column. Does not wrap around.
end LCD_Std_Out;
| 53.837607 | 82 | 0.621845 |
0eb89bfc3b4c1ad2375ef435b0a720aaaf67c00d | 4,320 | adb | Ada | src/security-auth-oauth-yahoo.adb | jquorning/ada-security | b9aa8e7deffaf71d50d501e284b821b8b0f942c3 | [
"Apache-2.0"
] | 19 | 2015-01-18T23:04:59.000Z | 2021-11-30T10:39:10.000Z | src/security-auth-oauth-yahoo.adb | jquorning/ada-security | b9aa8e7deffaf71d50d501e284b821b8b0f942c3 | [
"Apache-2.0"
] | 4 | 2020-08-06T15:37:51.000Z | 2022-02-04T20:19:39.000Z | src/security-auth-oauth-yahoo.adb | jquorning/ada-security | b9aa8e7deffaf71d50d501e284b821b8b0f942c3 | [
"Apache-2.0"
] | 3 | 2021-01-04T10:23:22.000Z | 2022-01-30T21:45:49.000Z | -----------------------------------------------------------------------
-- security-auth-oauth-yahoo -- Yahoo! OAuth based authentication
-- Copyright (C) 2013, 2014, 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.Log.Loggers;
with Security.OAuth.JWT;
package body Security.Auth.OAuth.Yahoo is
use Util.Log;
use Security.OAuth;
Log : constant Loggers.Logger := Util.Log.Loggers.Create ("Security.Auth.OAuth.Yahoo");
-- ------------------------------
-- Verify the OAuth access token and retrieve information about the user.
-- ------------------------------
overriding
procedure Verify_Access_Token (Realm : in Manager;
Assoc : in Association;
Request : in Parameters'Class;
Token : in Security.OAuth.Clients.Access_Token_Access;
Result : in out Authentication) is
pragma Unreferenced (Request);
begin
-- The token returned by Yahoo! must contain an id_token.
if not (Token.all in Security.OAuth.Clients.OpenID_Token'Class) then
Log.Warn ("Invalid token instance created: missing the id_token");
Set_Result (Result, INVALID_SIGNATURE, "invalid access token returned");
return;
end if;
-- The id_token is a JWT token that must be decoded and verified.
-- See https://developer.yahoo.com/oauth2/guide/openid_connect/decode_id_token.html
-- It contains information to identify the user.
declare
T : constant Security.OAuth.Clients.OpenID_Token_Access :=
Security.OAuth.Clients.OpenID_Token'Class (Token.all)'Access;
Info : constant Security.OAuth.JWT.Token := Security.OAuth.JWT.Decode (T.Get_Id_Token);
begin
-- Verify that the JWT token concerns our application.
if Security.OAuth.JWT.Get_Audience (Info) /= Realm.App.Get_Application_Identifier then
Set_Result (Result, INVALID_SIGNATURE,
"the access token was granted for another application");
return;
-- Verify that the issuer is Yahoo!
elsif Security.OAuth.JWT.Get_Issuer (Info) /= Realm.Issuer then
Set_Result (Result, INVALID_SIGNATURE,
"the access token was not generated by the expected authority");
return;
-- Verify that the nonce we received matches our nonce.
elsif Security.OAuth.JWT.Get_Claim (Info, "nonce") /= Assoc.Nonce then
Set_Result (Result, INVALID_SIGNATURE,
"the access token was not generated with the expected nonce");
return;
end if;
Result.Identity := Realm.Issuer;
Append (Result.Identity, "/");
Append (Result.Identity, Security.OAuth.JWT.Get_Subject (Info));
Result.Claimed_Id := Result.Identity;
Result.First_Name := To_Unbounded_String (JWT.Get_Claim (Info, "name", ""));
Result.Last_Name := To_Unbounded_String (JWT.Get_Claim (Info, "family_name", ""));
Result.Gender := To_Unbounded_String (JWT.Get_Claim (Info, "gender", ""));
Result.Nickname := To_Unbounded_String (JWT.Get_Claim (Info, "nickname", ""));
Result.Full_Name := To_Unbounded_String (JWT.Get_Claim (Info, "name", ""));
-- The email is optional and depends on the scope.
Result.Email := To_Unbounded_String (JWT.Get_Claim (Info, "email", ""));
Set_Result (Result, AUTHENTICATED, "authenticated");
end;
end Verify_Access_Token;
end Security.Auth.OAuth.Yahoo;
| 48 | 96 | 0.617593 |
20093c19abd2f6af7936c4612847294285424d1a | 44,035 | ads | Ada | gcc-gcc-7_3_0-release/gcc/ada/types.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/types.ads | best08618/asylo | 5a520a9f5c461ede0f32acc284017b737a43898c | [
"Apache-2.0"
] | null | null | null | gcc-gcc-7_3_0-release/gcc/ada/types.ads | best08618/asylo | 5a520a9f5c461ede0f32acc284017b737a43898c | [
"Apache-2.0"
] | 2 | 2020-07-27T00:22:36.000Z | 2021-04-01T09:41:02.000Z | ------------------------------------------------------------------------------
-- --
-- GNAT COMPILER COMPONENTS --
-- --
-- T Y P E S --
-- --
-- S p e c --
-- --
-- Copyright (C) 1992-2016, 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 host independent type definitions which are used
-- in more than one unit in the compiler. They are gathered here for easy
-- reference, although in some cases the full description is found in the
-- relevant module which implements the definition. The main reason that they
-- are not in their "natural" specs is that this would cause a lot of inter-
-- spec dependencies, and in particular some awkward circular dependencies
-- would have to be dealt with.
-- WARNING: There is a C version of this package. Any changes to this source
-- file must be properly reflected in the C header file types.h declarations.
-- Note: the declarations in this package reflect an expectation that the host
-- machine has an efficient integer base type with a range at least 32 bits
-- 2s-complement. If there are any machines for which this is not a correct
-- assumption, a significant number of changes will be required.
with System;
with Unchecked_Conversion;
with Unchecked_Deallocation;
package Types is
pragma Preelaborate;
-------------------------------
-- General Use Integer Types --
-------------------------------
type Int is range -2 ** 31 .. +2 ** 31 - 1;
-- Signed 32-bit integer
subtype Nat is Int range 0 .. Int'Last;
-- Non-negative Int values
subtype Pos is Int range 1 .. Int'Last;
-- Positive Int values
type Word is mod 2 ** 32;
-- Unsigned 32-bit integer
type Short is range -32768 .. +32767;
for Short'Size use 16;
-- 16-bit signed integer
type Byte is mod 2 ** 8;
for Byte'Size use 8;
-- 8-bit unsigned integer
type size_t is mod 2 ** Standard'Address_Size;
-- Memory size value, for use in calls to C routines
--------------------------------------
-- 8-Bit Character and String Types --
--------------------------------------
-- We use Standard.Character and Standard.String freely, since we are
-- compiling ourselves, and we properly implement the required 8-bit
-- character code as required in Ada 95. This section defines a few
-- general use constants and subtypes.
EOF : constant Character := ASCII.SUB;
-- The character SUB (16#1A#) is used in DOS and other systems derived
-- from DOS (XP, NT etc) to signal the end of a text file. Internally
-- all source files are ended by an EOF character, even on Unix systems.
-- An EOF character acts as the end of file only as the last character
-- of a source buffer, in any other position, it is treated as a blank
-- if it appears between tokens, and as an illegal character otherwise.
-- This makes life easier dealing with files that originated from DOS,
-- including concatenated files with interspersed EOF characters.
subtype Graphic_Character is Character range ' ' .. '~';
-- Graphic characters, as defined in ARM
subtype Line_Terminator is Character range ASCII.LF .. ASCII.CR;
-- Line terminator characters (LF, VT, FF, CR). For further details, see
-- the extensive discussion of line termination in the Sinput spec.
subtype Upper_Half_Character is
Character range Character'Val (16#80#) .. Character'Val (16#FF#);
-- 8-bit Characters with the upper bit set
type Character_Ptr is access all Character;
type String_Ptr is access all String;
type String_Ptr_Const is access constant String;
-- Standard character and string pointers
procedure Free is new Unchecked_Deallocation (String, String_Ptr);
-- Procedure for freeing dynamically allocated String values
subtype Big_String is String (Positive);
type Big_String_Ptr is access all Big_String;
-- Virtual type for handling imported big strings. Note that we should
-- never have any allocators for this type, but we don't give a storage
-- size of zero, since there are legitimate deallocations going on.
function To_Big_String_Ptr is
new Unchecked_Conversion (System.Address, Big_String_Ptr);
-- Used to obtain Big_String_Ptr values from external addresses
subtype Word_Hex_String is String (1 .. 8);
-- Type used to represent Word value as 8 hex digits, with lower case
-- letters for the alphabetic cases.
function Get_Hex_String (W : Word) return Word_Hex_String;
-- Convert word value to 8-character hex string
-----------------------------------------
-- Types Used for Text Buffer Handling --
-----------------------------------------
-- We can not use type String for text buffers, since we must use the
-- standard 32-bit integer as an index value, since we count on all index
-- values being the same size.
type Text_Ptr is new Int;
-- Type used for subscripts in text buffer
type Text_Buffer is array (Text_Ptr range <>) of Character;
-- Text buffer used to hold source file or library information file
type Text_Buffer_Ptr is access all Text_Buffer;
-- Text buffers for input files are allocated dynamically and this type
-- is used to reference these text buffers.
procedure Free is new Unchecked_Deallocation (Text_Buffer, Text_Buffer_Ptr);
-- Procedure for freeing dynamically allocated text buffers
------------------------------------------
-- Types Used for Source Input Handling --
------------------------------------------
type Logical_Line_Number is range 0 .. Int'Last;
for Logical_Line_Number'Size use 32;
-- Line number type, used for storing logical line numbers (i.e. line
-- numbers that include effects of any Source_Reference pragmas in the
-- source file). The value zero indicates a line containing a source
-- reference pragma.
No_Line_Number : constant Logical_Line_Number := 0;
-- Special value used to indicate no line number
type Physical_Line_Number is range 1 .. Int'Last;
for Physical_Line_Number'Size use 32;
-- Line number type, used for storing physical line numbers (i.e. line
-- numbers in the physical file being compiled, unaffected by the presence
-- of source reference pragmas).
type Column_Number is range 0 .. 32767;
for Column_Number'Size use 16;
-- Column number (assume that 2**15 - 1 is large enough). The range for
-- this type is used to compute Hostparm.Max_Line_Length. See also the
-- processing for -gnatyM in Stylesw).
No_Column_Number : constant Column_Number := 0;
-- Special value used to indicate no column number
Source_Align : constant := 2 ** 12;
-- Alignment requirement for source buffers (by keeping source buffers
-- aligned, we can optimize the implementation of Get_Source_File_Index.
-- See this routine in Sinput for details.
subtype Source_Buffer is Text_Buffer;
-- Type used to store text of a source file. The buffer for the main
-- source (the source specified on the command line) has a lower bound
-- starting at zero. Subsequent subsidiary sources have lower bounds
-- which are one greater than the previous upper bound, rounded up to
-- a multiple of Source_Align.
subtype Big_Source_Buffer is Text_Buffer (0 .. Text_Ptr'Last);
-- This is a virtual type used as the designated type of the access type
-- Source_Buffer_Ptr, see Osint.Read_Source_File for details.
type Source_Buffer_Ptr is access all Big_Source_Buffer;
-- Pointer to source buffer. We use virtual origin addressing for source
-- buffers, with thin pointers. The pointer points to a virtual instance
-- of type Big_Source_Buffer, where the actual type is in fact of type
-- Source_Buffer. The address is adjusted so that the virtual origin
-- addressing works correctly. See Osint.Read_Source_Buffer for further
-- details. Again, as for Big_String_Ptr, we should never allocate using
-- this type, but we don't give a storage size clause of zero, since we
-- may end up doing deallocations of instances allocated manually.
subtype Source_Ptr is Text_Ptr;
-- Type used to represent a source location, which is a subscript of a
-- character in the source buffer. As noted above, different source buffers
-- have different ranges, so it is possible to tell from a Source_Ptr value
-- which source it refers to. Note that negative numbers are allowed to
-- accommodate the following special values.
No_Location : constant Source_Ptr := -1;
-- Value used to indicate no source position set in a node. A test for a
-- Source_Ptr value being > No_Location is the approved way to test for a
-- standard value that does not include No_Location or any of the following
-- special definitions. One important use of No_Location is to label
-- generated nodes that we don't want the debugger to see in normal mode
-- (very often we conditionalize so that we set No_Location in normal mode
-- and the corresponding source line in -gnatD mode).
Standard_Location : constant Source_Ptr := -2;
-- Used for all nodes in the representation of package Standard other than
-- nodes representing the contents of Standard.ASCII. Note that testing for
-- a value being <= Standard_Location tests for both Standard_Location and
-- for Standard_ASCII_Location.
Standard_ASCII_Location : constant Source_Ptr := -3;
-- Used for all nodes in the presentation of package Standard.ASCII
System_Location : constant Source_Ptr := -4;
-- Used to identify locations of pragmas scanned by Targparm, where we know
-- the location is in System, but we don't know exactly what line.
First_Source_Ptr : constant Source_Ptr := 0;
-- Starting source pointer index value for first source program
-------------------------------------
-- Range Definitions for Tree Data --
-------------------------------------
-- The tree has fields that can hold any of the following types:
-- Pointers to other tree nodes (type Node_Id)
-- List pointers (type List_Id)
-- Element list pointers (type Elist_Id)
-- Names (type Name_Id)
-- Strings (type String_Id)
-- Universal integers (type Uint)
-- Universal reals (type Ureal)
-- In most contexts, the strongly typed interface determines which of these
-- types is present. However, there are some situations (involving untyped
-- traversals of the tree), where it is convenient to be easily able to
-- distinguish these values. The underlying representation in all cases is
-- an integer type Union_Id, and we ensure that the range of the various
-- possible values for each of the above types is disjoint so that this
-- distinction is possible.
-- Note: it is also helpful for debugging purposes to make these ranges
-- distinct. If a bug leads to misidentification of a value, then it will
-- typically result in an out of range value and a Constraint_Error.
type Union_Id is new Int;
-- The type in the tree for a union of possible ID values
List_Low_Bound : constant := -100_000_000;
-- The List_Id values are subscripts into an array of list headers which
-- has List_Low_Bound as its lower bound. This value is chosen so that all
-- List_Id values are negative, and the value zero is in the range of both
-- List_Id and Node_Id values (see further description below).
List_High_Bound : constant := 0;
-- Maximum List_Id subscript value. This allows up to 100 million list Id
-- values, which is in practice infinite, and there is no need to check the
-- range. The range overlaps the node range by one element (with value
-- zero), which is used both for the Empty node, and for indicating no
-- list. The fact that the same value is used is convenient because it
-- means that the default value of Empty applies to both nodes and lists,
-- and also is more efficient to test for.
Node_Low_Bound : constant := 0;
-- The tree Id values start at zero, because we use zero for Empty (to
-- allow a zero test for Empty). Actual tree node subscripts start at 0
-- since Empty is a legitimate node value.
Node_High_Bound : constant := 099_999_999;
-- Maximum number of nodes that can be allocated is 100 million, which
-- is in practice infinite, and there is no need to check the range.
Elist_Low_Bound : constant := 100_000_000;
-- The Elist_Id values are subscripts into an array of elist headers which
-- has Elist_Low_Bound as its lower bound.
Elist_High_Bound : constant := 199_999_999;
-- Maximum Elist_Id subscript value. This allows up to 100 million Elists,
-- which is in practice infinite and there is no need to check the range.
Elmt_Low_Bound : constant := 200_000_000;
-- Low bound of element Id values. The use of these values is internal to
-- the Elists package, but the definition of the range is included here
-- since it must be disjoint from other Id values. The Elmt_Id values are
-- subscripts into an array of list elements which has this as lower bound.
Elmt_High_Bound : constant := 299_999_999;
-- Upper bound of Elmt_Id values. This allows up to 100 million element
-- list members, which is in practice infinite (no range check needed).
Names_Low_Bound : constant := 300_000_000;
-- Low bound for name Id values
Names_High_Bound : constant := 399_999_999;
-- Maximum number of names that can be allocated is 100 million, which is
-- in practice infinite and there is no need to check the range.
Strings_Low_Bound : constant := 400_000_000;
-- Low bound for string Id values
Strings_High_Bound : constant := 499_999_999;
-- Maximum number of strings that can be allocated is 100 million, which
-- is in practice infinite and there is no need to check the range.
Ureal_Low_Bound : constant := 500_000_000;
-- Low bound for Ureal values
Ureal_High_Bound : constant := 599_999_999;
-- Maximum number of Ureal values stored is 100_000_000 which is in
-- practice infinite so that no check is required.
Uint_Low_Bound : constant := 600_000_000;
-- Low bound for Uint values
Uint_Table_Start : constant := 2_000_000_000;
-- Location where table entries for universal integers start (see
-- Uintp spec for details of the representation of Uint values).
Uint_High_Bound : constant := 2_099_999_999;
-- The range of Uint values is very large, since a substantial part
-- of this range is used to store direct values, see Uintp for details.
-- The following subtype definitions are used to provide convenient names
-- for membership tests on Int values to see what data type range they
-- lie in. Such tests appear only in the lowest level packages.
subtype List_Range is Union_Id
range List_Low_Bound .. List_High_Bound;
subtype Node_Range is Union_Id
range Node_Low_Bound .. Node_High_Bound;
subtype Elist_Range is Union_Id
range Elist_Low_Bound .. Elist_High_Bound;
subtype Elmt_Range is Union_Id
range Elmt_Low_Bound .. Elmt_High_Bound;
subtype Names_Range is Union_Id
range Names_Low_Bound .. Names_High_Bound;
subtype Strings_Range is Union_Id
range Strings_Low_Bound .. Strings_High_Bound;
subtype Uint_Range is Union_Id
range Uint_Low_Bound .. Uint_High_Bound;
subtype Ureal_Range is Union_Id
range Ureal_Low_Bound .. Ureal_High_Bound;
-----------------------------
-- Types for Atree Package --
-----------------------------
-- Node_Id values are used to identify nodes in the tree. They are
-- subscripts into the Nodes table declared in package Atree. Note that
-- the special values Empty and Error are subscripts into this table.
-- See package Atree for further details.
type Node_Id is range Node_Low_Bound .. Node_High_Bound;
-- Type used to identify nodes in the tree
subtype Entity_Id is Node_Id;
-- A synonym for node types, used in the Einfo package to refer to nodes
-- that are entities (i.e. nodes with an Nkind of N_Defining_xxx). All such
-- nodes are extended nodes and these are the only extended nodes, so that
-- in practice entity and extended nodes are synonymous.
subtype Node_Or_Entity_Id is Node_Id;
-- A synonym for node types, used in cases where a given value may be used
-- to represent either a node or an entity. We like to minimize such uses
-- for obvious reasons of logical type consistency, but where such uses
-- occur, they should be documented by use of this type.
Empty : constant Node_Id := Node_Low_Bound;
-- Used to indicate null node. A node is actually allocated with this
-- Id value, so that Nkind (Empty) = N_Empty. Note that Node_Low_Bound
-- is zero, so Empty = No_List = zero.
Empty_List_Or_Node : constant := 0;
-- This constant is used in situations (e.g. initializing empty fields)
-- where the value set will be used to represent either an empty node or
-- a non-existent list, depending on the context.
Error : constant Node_Id := Node_Low_Bound + 1;
-- Used to indicate an error in the source program. A node is actually
-- allocated with this Id value, so that Nkind (Error) = N_Error.
Empty_Or_Error : constant Node_Id := Error;
-- Since Empty and Error are the first two Node_Id values, the test for
-- N <= Empty_Or_Error tests to see if N is Empty or Error. This definition
-- provides convenient self-documentation for such tests.
First_Node_Id : constant Node_Id := Node_Low_Bound;
-- Subscript of first allocated node. Note that Empty and Error are both
-- allocated nodes, whose Nkind fields can be accessed without error.
------------------------------
-- Types for Nlists Package --
------------------------------
-- List_Id values are used to identify node lists stored in the tree, so
-- that each node can be on at most one such list (see package Nlists for
-- further details). Note that the special value Error_List is a subscript
-- in this table, but the value No_List is *not* a valid subscript, and any
-- attempt to apply list operations to No_List will cause a (detected)
-- error.
type List_Id is range List_Low_Bound .. List_High_Bound;
-- Type used to identify a node list
No_List : constant List_Id := List_High_Bound;
-- Used to indicate absence of a list. Note that the value is zero, which
-- is the same as Empty, which is helpful in initializing nodes where a
-- value of zero can represent either an empty node or an empty list.
Error_List : constant List_Id := List_Low_Bound;
-- Used to indicate that there was an error in the source program in a
-- context which would normally require a list. This node appears to be
-- an empty list to the list operations (a null list is actually allocated
-- which has this Id value).
First_List_Id : constant List_Id := Error_List;
-- Subscript of first allocated list header
------------------------------
-- Types for Elists Package --
------------------------------
-- Element list Id values are used to identify element lists stored outside
-- of the tree, allowing nodes to be members of more than one such list
-- (see package Elists for further details).
type Elist_Id is range Elist_Low_Bound .. Elist_High_Bound;
-- Type used to identify an element list (Elist header table subscript)
No_Elist : constant Elist_Id := Elist_Low_Bound;
-- Used to indicate absence of an element list. Note that this is not an
-- actual Elist header, so element list operations on this value are not
-- valid.
First_Elist_Id : constant Elist_Id := No_Elist + 1;
-- Subscript of first allocated Elist header
-- Element Id values are used to identify individual elements of an element
-- list (see package Elists for further details).
type Elmt_Id is range Elmt_Low_Bound .. Elmt_High_Bound;
-- Type used to identify an element list
No_Elmt : constant Elmt_Id := Elmt_Low_Bound;
-- Used to represent empty element
First_Elmt_Id : constant Elmt_Id := No_Elmt + 1;
-- Subscript of first allocated Elmt table entry
-------------------------------
-- Types for Stringt Package --
-------------------------------
-- String_Id values are used to identify entries in the strings table. They
-- are subscripts into the Strings table defined in package Stringt.
-- Note that with only a few exceptions, which are clearly documented, the
-- type String_Id should be regarded as a private type. In particular it is
-- never appropriate to perform arithmetic operations using this type.
-- Doesn't this also apply to all other *_Id types???
type String_Id is range Strings_Low_Bound .. Strings_High_Bound;
-- Type used to identify entries in the strings table
No_String : constant String_Id := Strings_Low_Bound;
-- Used to indicate missing string Id. Note that the value zero is used
-- to indicate a missing data value for all the Int types in this section.
First_String_Id : constant String_Id := No_String + 1;
-- First subscript allocated in string table
-------------------------
-- Character Code Type --
-------------------------
-- The type Char is used for character data internally in the compiler, but
-- character codes in the source are represented by the Char_Code type.
-- Each character literal in the source is interpreted as being one of the
-- 16#7FFF_FFFF# possible Wide_Wide_Character codes, and a unique Integer
-- value is assigned, corresponding to the UTF-32 value, which also
-- corresponds to the Pos value in the Wide_Wide_Character type, and also
-- corresponds to the Pos value in the Wide_Character and Character types
-- for values that are in appropriate range. String literals are similarly
-- interpreted as a sequence of such codes.
type Char_Code_Base is mod 2 ** 32;
for Char_Code_Base'Size use 32;
subtype Char_Code is Char_Code_Base range 0 .. 16#7FFF_FFFF#;
for Char_Code'Value_Size use 32;
for Char_Code'Object_Size use 32;
function Get_Char_Code (C : Character) return Char_Code;
pragma Inline (Get_Char_Code);
-- Function to obtain internal character code from source character. For
-- the moment, the internal character code is simply the Pos value of the
-- input source character, but we provide this interface for possible
-- later support of alternative character sets.
function In_Character_Range (C : Char_Code) return Boolean;
pragma Inline (In_Character_Range);
-- Determines if the given character code is in range of type Character,
-- and if so, returns True. If not, returns False.
function In_Wide_Character_Range (C : Char_Code) return Boolean;
pragma Inline (In_Wide_Character_Range);
-- Determines if the given character code is in range of the type
-- Wide_Character, and if so, returns True. If not, returns False.
function Get_Character (C : Char_Code) return Character;
pragma Inline (Get_Character);
-- For a character C that is in Character range (see above function), this
-- function returns the corresponding Character value. It is an error to
-- call Get_Character if C is not in Character range.
function Get_Wide_Character (C : Char_Code) return Wide_Character;
-- For a character C that is in Wide_Character range (see above function),
-- this function returns the corresponding Wide_Character value. It is an
-- error to call Get_Wide_Character if C is not in Wide_Character range.
---------------------------------------
-- Types used for Library Management --
---------------------------------------
type Unit_Number_Type is new Int range -1 .. Int'Last;
-- Unit number. The main source is unit 0, and subsidiary sources have
-- non-zero numbers starting with 1. Unit numbers are used to index the
-- Units table in package Lib.
Main_Unit : constant Unit_Number_Type := 0;
-- Unit number value for main unit
No_Unit : constant Unit_Number_Type := -1;
-- Special value used to signal no unit
type Source_File_Index is new Int range -1 .. Int'Last;
-- Type used to index the source file table (see package Sinput)
Internal_Source_File : constant Source_File_Index :=
Source_File_Index'First;
-- Value used to indicate the buffer for the source-code-like strings
-- internally created withing the compiler (see package Sinput)
No_Source_File : constant Source_File_Index := 0;
-- Value used to indicate no source file present
-----------------------------------
-- Representation of Time Stamps --
-----------------------------------
-- All compiled units are marked with a time stamp which is derived from
-- the source file (we assume that the host system has the concept of a
-- file time stamp which is modified when a file is modified). These
-- time stamps are used to ensure consistency of the set of units that
-- constitutes a library. Time stamps are 14-character strings with
-- with the following format:
-- YYYYMMDDHHMMSS
-- YYYY year
-- MM month (2 digits 01-12)
-- DD day (2 digits 01-31)
-- HH hour (2 digits 00-23)
-- MM minutes (2 digits 00-59)
-- SS seconds (2 digits 00-59)
-- In the case of Unix systems (and other systems which keep the time in
-- GMT), the time stamp is the GMT time of the file, not the local time.
-- This solves problems in using libraries across networks with clients
-- spread across multiple time-zones.
Time_Stamp_Length : constant := 14;
-- Length of time stamp value
subtype Time_Stamp_Index is Natural range 1 .. Time_Stamp_Length;
type Time_Stamp_Type is new String (Time_Stamp_Index);
-- Type used to represent time stamp
Empty_Time_Stamp : constant Time_Stamp_Type := (others => ' ');
-- Value representing an empty or missing time stamp. Looks less than any
-- real time stamp if two time stamps are compared. Note that although this
-- is not private, clients should not rely on the exact way in which this
-- string is represented, and instead should use the subprograms below.
Dummy_Time_Stamp : constant Time_Stamp_Type := (others => '0');
-- This is used for dummy time stamp values used in the D lines for
-- non-existent files, and is intended to be an impossible value.
function "=" (Left, Right : Time_Stamp_Type) return Boolean;
function "<=" (Left, Right : Time_Stamp_Type) return Boolean;
function ">=" (Left, Right : Time_Stamp_Type) return Boolean;
function "<" (Left, Right : Time_Stamp_Type) return Boolean;
function ">" (Left, Right : Time_Stamp_Type) return Boolean;
-- Comparison functions on time stamps. Note that two time stamps are
-- defined as being equal if they have the same day/month/year and the
-- hour/minutes/seconds values are within 2 seconds of one another. This
-- deals with rounding effects in library file time stamps caused by
-- copying operations during installation. We have particularly noticed
-- that WinNT seems susceptible to such changes.
--
-- Note: the Empty_Time_Stamp value looks equal to itself, and less than
-- any non-empty time stamp value.
procedure Split_Time_Stamp
(TS : Time_Stamp_Type;
Year : out Nat;
Month : out Nat;
Day : out Nat;
Hour : out Nat;
Minutes : out Nat;
Seconds : out Nat);
-- Given a time stamp, decompose it into its components
procedure Make_Time_Stamp
(Year : Nat;
Month : Nat;
Day : Nat;
Hour : Nat;
Minutes : Nat;
Seconds : Nat;
TS : out Time_Stamp_Type);
-- Given the components of a time stamp, initialize the value
-------------------------------------
-- Types used for Check Management --
-------------------------------------
type Check_Id is new Nat;
-- Type used to represent a check id
No_Check_Id : constant := 0;
-- Check_Id value used to indicate no check
Access_Check : constant := 1;
Accessibility_Check : constant := 2;
Alignment_Check : constant := 3;
Allocation_Check : constant := 4;
Atomic_Synchronization : constant := 5;
Discriminant_Check : constant := 6;
Division_Check : constant := 7;
Duplicated_Tag_Check : constant := 8;
Elaboration_Check : constant := 9;
Index_Check : constant := 10;
Length_Check : constant := 11;
Overflow_Check : constant := 12;
Predicate_Check : constant := 13;
Range_Check : constant := 14;
Storage_Check : constant := 15;
Tag_Check : constant := 16;
Validity_Check : constant := 17;
Container_Checks : constant := 18;
Tampering_Check : constant := 19;
-- Values used to represent individual predefined checks (including the
-- setting of Atomic_Synchronization, which is implemented internally using
-- a "check" whose name is Atomic_Synchronization).
All_Checks : constant := 20;
-- Value used to represent All_Checks value
subtype Predefined_Check_Id is Check_Id range 1 .. All_Checks;
-- Subtype for predefined checks, including All_Checks
-- The following array contains an entry for each recognized check name
-- for pragma Suppress. It is used to represent current settings of scope
-- based suppress actions from pragma Suppress or command line settings.
-- Note: when Suppress_Array (All_Checks) is True, then generally all other
-- specific check entries are set True, except for the Elaboration_Check
-- entry which is set only if an explicit Suppress for this check is given.
-- The reason for this non-uniformity is that we do not want All_Checks to
-- suppress elaboration checking when using the static elaboration model.
-- We recognize only an explicit suppress of Elaboration_Check as a signal
-- that the static elaboration checking should skip a compile time check.
type Suppress_Array is array (Predefined_Check_Id) of Boolean;
pragma Pack (Suppress_Array);
-- To add a new check type to GNAT, the following steps are required:
-- 1. Add an entry to Snames spec for the new name
-- 2. Add an entry to the definition of Check_Id above
-- 3. Add a new function to Checks to handle the new check test
-- 4. Add a new Do_xxx_Check flag to Sinfo (if required)
-- 5. Add appropriate checks for the new test
-- The following provides precise details on the mode used to generate
-- code for intermediate operations in expressions for signed integer
-- arithmetic (and how to generate overflow checks if enabled). Note
-- that this only affects handling of intermediate results. The final
-- result must always fit within the target range, and if overflow
-- checking is enabled, the check on the final result is against this
-- target range.
type Overflow_Mode_Type is (
Not_Set,
-- Dummy value used during initialization process to show that the
-- corresponding value has not yet been initialized.
Strict,
-- Operations are done in the base type of the subexpression. If
-- overflow checks are enabled, then the check is against the range
-- of this base type.
Minimized,
-- Where appropriate, intermediate arithmetic operations are performed
-- with an extended range, using Long_Long_Integer if necessary. If
-- overflow checking is enabled, then the check is against the range
-- of Long_Long_Integer.
Eliminated);
-- In this mode arbitrary precision arithmetic is used as needed to
-- ensure that it is impossible for intermediate arithmetic to cause an
-- overflow. In this mode, intermediate expressions are not affected by
-- the overflow checking mode, since overflows are eliminated.
subtype Minimized_Or_Eliminated is
Overflow_Mode_Type range Minimized .. Eliminated;
-- Define subtype so that clients don't need to know ordering. Note that
-- Overflow_Mode_Type is not marked as an ordered enumeration type.
-- The following structure captures the state of check suppression or
-- activation at a particular point in the program execution.
type Suppress_Record is record
Suppress : Suppress_Array;
-- Indicates suppression status of each possible check
Overflow_Mode_General : Overflow_Mode_Type;
-- This field indicates the mode for handling code generation and
-- overflow checking (if enabled) for intermediate expression values.
-- This applies to general expressions outside assertions.
Overflow_Mode_Assertions : Overflow_Mode_Type;
-- This field indicates the mode for handling code generation and
-- overflow checking (if enabled) for intermediate expression values.
-- This applies to any expression occuring inside assertions.
end record;
-----------------------------------
-- Global Exception Declarations --
-----------------------------------
-- This section contains declarations of exceptions that are used
-- throughout the compiler or in other GNAT tools.
Unrecoverable_Error : exception;
-- This exception is raised to immediately terminate the compilation of the
-- current source program. Used in situations where things are bad enough
-- that it doesn't seem worth continuing (e.g. max errors reached, or a
-- required file is not found). Also raised when the compiler finds itself
-- in trouble after an error (see Comperr).
Terminate_Program : exception;
-- This exception is raised to immediately terminate the tool being
-- executed. Each tool where this exception may be raised must have a
-- single exception handler that contains only a null statement and that is
-- the last statement of the program. If needed, procedure Set_Exit_Status
-- is called with the appropriate exit status before raising
-- Terminate_Program.
---------------------------------
-- Parameter Mechanism Control --
---------------------------------
-- Function and parameter entities have a field that records the passing
-- mechanism. See specification of Sem_Mech for full details. The following
-- subtype is used to represent values of this type:
subtype Mechanism_Type is Int range -2 .. Int'Last;
-- Type used to represent a mechanism value. This is a subtype rather than
-- a type to avoid some annoying processing problems with certain routines
-- in Einfo (processing them to create the corresponding C). The values in
-- the range -2 .. 0 are used to represent mechanism types declared as
-- named constants in the spec of Sem_Mech. Positive values are used for
-- the case of a pragma C_Pass_By_Copy that sets a threshold value for the
-- mechanism to be used. For example if pragma C_Pass_By_Copy (32) is given
-- then Default_C_Record_Mechanism is set to 32, and the meaning is to use
-- By_Reference if the size is greater than 32, and By_Copy otherwise.
------------------------------
-- Run-Time Exception Codes --
------------------------------
-- When the code generator generates a run-time exception, it provides a
-- reason code which is one of the following. This reason code is used to
-- select the appropriate run-time routine to be called, determining both
-- the exception to be raised, and the message text to be added.
-- The prefix CE/PE/SE indicates the exception to be raised
-- CE = Constraint_Error
-- PE = Program_Error
-- SE = Storage_Error
-- The remaining part of the name indicates the message text to be added,
-- where all letters are lower case, and underscores are converted to
-- spaces (for example CE_Invalid_Data adds the text "invalid data").
-- To add a new code, you need to do the following:
-- 1. Assign a new number to the reason. Do not renumber existing codes,
-- since this causes compatibility/bootstrap issues, so always add the
-- new code at the end of the list.
-- 2. Update the contents of the array Kind
-- 3. Modify the corresponding definitions in types.h, including the
-- definition of last_reason_code.
-- 4. Add the name of the routines in exp_ch11.Get_RT_Exception_Name
-- 5. Add a new routine in Ada.Exceptions with the appropriate call and
-- static string constant. Note that there is more than one version
-- of a-except.adb which must be modified.
-- Note on ordering of references. For the tables in Ada.Exceptions units,
-- usually the ordering does not matter, and we use the same ordering as
-- is used here (note the requirement in the ordering here that CE/PE/SE
-- codes be kept together, so the subtype declarations work OK).
type RT_Exception_Code is
(CE_Access_Check_Failed, -- 00
CE_Access_Parameter_Is_Null, -- 01
CE_Discriminant_Check_Failed, -- 02
CE_Divide_By_Zero, -- 03
CE_Explicit_Raise, -- 04
CE_Index_Check_Failed, -- 05
CE_Invalid_Data, -- 06
CE_Length_Check_Failed, -- 07
CE_Null_Exception_Id, -- 08
CE_Null_Not_Allowed, -- 09
CE_Overflow_Check_Failed, -- 10
CE_Partition_Check_Failed, -- 11
CE_Range_Check_Failed, -- 12
CE_Tag_Check_Failed, -- 13
PE_Access_Before_Elaboration, -- 14
PE_Accessibility_Check_Failed, -- 15
PE_Address_Of_Intrinsic, -- 16
PE_Aliased_Parameters, -- 17
PE_All_Guards_Closed, -- 18
PE_Bad_Predicated_Generic_Type, -- 19
PE_Current_Task_In_Entry_Body, -- 20
PE_Duplicated_Entry_Address, -- 21
PE_Explicit_Raise, -- 22
PE_Finalize_Raised_Exception, -- 23
PE_Implicit_Return, -- 24
PE_Misaligned_Address_Value, -- 25
PE_Missing_Return, -- 26
PE_Overlaid_Controlled_Object, -- 27
PE_Potentially_Blocking_Operation, -- 28
PE_Stubbed_Subprogram_Called, -- 29
PE_Unchecked_Union_Restriction, -- 30
PE_Non_Transportable_Actual, -- 31
SE_Empty_Storage_Pool, -- 32
SE_Explicit_Raise, -- 33
SE_Infinite_Recursion, -- 34
SE_Object_Too_Large, -- 35
PE_Stream_Operation_Not_Allowed); -- 36
Last_Reason_Code : constant := 36;
-- Last reason code
type Reason_Kind is (CE_Reason, PE_Reason, SE_Reason);
-- Categorization of reason codes by exception raised
Rkind : constant array (RT_Exception_Code range <>) of Reason_Kind :=
(CE_Access_Check_Failed => CE_Reason,
CE_Access_Parameter_Is_Null => CE_Reason,
CE_Discriminant_Check_Failed => CE_Reason,
CE_Divide_By_Zero => CE_Reason,
CE_Explicit_Raise => CE_Reason,
CE_Index_Check_Failed => CE_Reason,
CE_Invalid_Data => CE_Reason,
CE_Length_Check_Failed => CE_Reason,
CE_Null_Exception_Id => CE_Reason,
CE_Null_Not_Allowed => CE_Reason,
CE_Overflow_Check_Failed => CE_Reason,
CE_Partition_Check_Failed => CE_Reason,
CE_Range_Check_Failed => CE_Reason,
CE_Tag_Check_Failed => CE_Reason,
PE_Access_Before_Elaboration => PE_Reason,
PE_Accessibility_Check_Failed => PE_Reason,
PE_Address_Of_Intrinsic => PE_Reason,
PE_Aliased_Parameters => PE_Reason,
PE_All_Guards_Closed => PE_Reason,
PE_Bad_Predicated_Generic_Type => PE_Reason,
PE_Current_Task_In_Entry_Body => PE_Reason,
PE_Duplicated_Entry_Address => PE_Reason,
PE_Explicit_Raise => PE_Reason,
PE_Finalize_Raised_Exception => PE_Reason,
PE_Implicit_Return => PE_Reason,
PE_Misaligned_Address_Value => PE_Reason,
PE_Missing_Return => PE_Reason,
PE_Overlaid_Controlled_Object => PE_Reason,
PE_Potentially_Blocking_Operation => PE_Reason,
PE_Stubbed_Subprogram_Called => PE_Reason,
PE_Unchecked_Union_Restriction => PE_Reason,
PE_Non_Transportable_Actual => PE_Reason,
PE_Stream_Operation_Not_Allowed => PE_Reason,
SE_Empty_Storage_Pool => SE_Reason,
SE_Explicit_Raise => SE_Reason,
SE_Infinite_Recursion => SE_Reason,
SE_Object_Too_Large => SE_Reason);
end Types;
| 46.746285 | 79 | 0.656659 |
c5bdfe234a6272c3536702e1366d68847c8b068e | 468 | ads | Ada | src/crc.ads | JeremyGrosser/synack_misc | 08f791aa6200c95767cce80a6e0998f00e19acfd | [
"BSD-3-Clause"
] | null | null | null | src/crc.ads | JeremyGrosser/synack_misc | 08f791aa6200c95767cce80a6e0998f00e19acfd | [
"BSD-3-Clause"
] | null | null | null | src/crc.ads | JeremyGrosser/synack_misc | 08f791aa6200c95767cce80a6e0998f00e19acfd | [
"BSD-3-Clause"
] | null | null | null | --
-- Copyright (C) 2022 Jeremy Grosser <[email protected]>
--
-- SPDX-License-Identifier: BSD-3-Clause
--
generic
type Word is mod <>;
type Word_Array is array (Natural range <>) of Word;
package CRC
with Preelaborate
is
Poly : Word;
Sum : Word := 0;
procedure Update
(Data : Word);
procedure Update
(Data : Word_Array);
function Calculate
(Data : Word_Array;
Initial : Word := 0)
return Word;
end CRC;
| 17.333333 | 56 | 0.611111 |
0ed9099014e77129eaf2ac88a88316f14134118a | 15,026 | ads | Ada | source/amf/uml/amf-internals-uml_interface_realizations.ads | svn2github/matreshka | 9d222b3ad9da508855fb1f5adbe5e8a4fad4c530 | [
"BSD-3-Clause"
] | 24 | 2016-11-29T06:59:41.000Z | 2021-08-30T11:55:16.000Z | source/amf/uml/amf-internals-uml_interface_realizations.ads | svn2github/matreshka | 9d222b3ad9da508855fb1f5adbe5e8a4fad4c530 | [
"BSD-3-Clause"
] | 2 | 2019-01-16T05:15:20.000Z | 2019-02-03T10:03:32.000Z | source/amf/uml/amf-internals-uml_interface_realizations.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$
------------------------------------------------------------------------------
with AMF.Internals.UML_Packageable_Elements;
with AMF.UML.Behaviored_Classifiers;
with AMF.UML.Dependencies.Collections;
with AMF.UML.Elements.Collections;
with AMF.UML.Interface_Realizations;
with AMF.UML.Interfaces;
with AMF.UML.Named_Elements.Collections;
with AMF.UML.Namespaces;
with AMF.UML.Opaque_Expressions;
with AMF.UML.Packages.Collections;
with AMF.UML.Parameterable_Elements;
with AMF.UML.String_Expressions;
with AMF.UML.Template_Parameters;
with AMF.Visitors;
package AMF.Internals.UML_Interface_Realizations is
type UML_Interface_Realization_Proxy is
limited new AMF.Internals.UML_Packageable_Elements.UML_Packageable_Element_Proxy
and AMF.UML.Interface_Realizations.UML_Interface_Realization with null record;
overriding function Get_Contract
(Self : not null access constant UML_Interface_Realization_Proxy)
return AMF.UML.Interfaces.UML_Interface_Access;
-- Getter of InterfaceRealization::contract.
--
-- References the Interface specifying the conformance contract.
overriding procedure Set_Contract
(Self : not null access UML_Interface_Realization_Proxy;
To : AMF.UML.Interfaces.UML_Interface_Access);
-- Setter of InterfaceRealization::contract.
--
-- References the Interface specifying the conformance contract.
overriding function Get_Implementing_Classifier
(Self : not null access constant UML_Interface_Realization_Proxy)
return AMF.UML.Behaviored_Classifiers.UML_Behaviored_Classifier_Access;
-- Getter of InterfaceRealization::implementingClassifier.
--
-- References the BehavioredClassifier that owns this Interfacerealization
-- (i.e., the classifier that realizes the Interface to which it points).
overriding procedure Set_Implementing_Classifier
(Self : not null access UML_Interface_Realization_Proxy;
To : AMF.UML.Behaviored_Classifiers.UML_Behaviored_Classifier_Access);
-- Setter of InterfaceRealization::implementingClassifier.
--
-- References the BehavioredClassifier that owns this Interfacerealization
-- (i.e., the classifier that realizes the Interface to which it points).
overriding function Get_Mapping
(Self : not null access constant UML_Interface_Realization_Proxy)
return AMF.UML.Opaque_Expressions.UML_Opaque_Expression_Access;
-- Getter of Abstraction::mapping.
--
-- An composition of an Expression that states the abstraction
-- relationship between the supplier and the client. In some cases, such
-- as Derivation, it is usually formal and unidirectional; in other cases,
-- such as Trace, it is usually informal and bidirectional. The mapping
-- expression is optional and may be omitted if the precise relationship
-- between the elements is not specified.
overriding procedure Set_Mapping
(Self : not null access UML_Interface_Realization_Proxy;
To : AMF.UML.Opaque_Expressions.UML_Opaque_Expression_Access);
-- Setter of Abstraction::mapping.
--
-- An composition of an Expression that states the abstraction
-- relationship between the supplier and the client. In some cases, such
-- as Derivation, it is usually formal and unidirectional; in other cases,
-- such as Trace, it is usually informal and bidirectional. The mapping
-- expression is optional and may be omitted if the precise relationship
-- between the elements is not specified.
overriding function Get_Client
(Self : not null access constant UML_Interface_Realization_Proxy)
return AMF.UML.Named_Elements.Collections.Set_Of_UML_Named_Element;
-- Getter of Dependency::client.
--
-- The element(s) dependent on the supplier element(s). In some cases
-- (such as a Trace Abstraction) the assignment of direction (that is, the
-- designation of the client element) is at the discretion of the modeler,
-- and is a stipulation.
overriding function Get_Supplier
(Self : not null access constant UML_Interface_Realization_Proxy)
return AMF.UML.Named_Elements.Collections.Set_Of_UML_Named_Element;
-- Getter of Dependency::supplier.
--
-- The element(s) independent of the client element(s), in the same
-- respect and the same dependency relationship. In some directed
-- dependency relationships (such as Refinement Abstractions), a common
-- convention in the domain of class-based OO software is to put the more
-- abstract element in this role. Despite this convention, users of UML
-- may stipulate a sense of dependency suitable for their domain, which
-- makes a more abstract element dependent on that which is more specific.
overriding function Get_Source
(Self : not null access constant UML_Interface_Realization_Proxy)
return AMF.UML.Elements.Collections.Set_Of_UML_Element;
-- Getter of DirectedRelationship::source.
--
-- Specifies the sources of the DirectedRelationship.
overriding function Get_Target
(Self : not null access constant UML_Interface_Realization_Proxy)
return AMF.UML.Elements.Collections.Set_Of_UML_Element;
-- Getter of DirectedRelationship::target.
--
-- Specifies the targets of the DirectedRelationship.
overriding function Get_Related_Element
(Self : not null access constant UML_Interface_Realization_Proxy)
return AMF.UML.Elements.Collections.Set_Of_UML_Element;
-- Getter of Relationship::relatedElement.
--
-- Specifies the elements related by the Relationship.
overriding function Get_Client_Dependency
(Self : not null access constant UML_Interface_Realization_Proxy)
return AMF.UML.Dependencies.Collections.Set_Of_UML_Dependency;
-- Getter of NamedElement::clientDependency.
--
-- Indicates the dependencies that reference the client.
overriding function Get_Name_Expression
(Self : not null access constant UML_Interface_Realization_Proxy)
return AMF.UML.String_Expressions.UML_String_Expression_Access;
-- Getter of NamedElement::nameExpression.
--
-- The string expression used to define the name of this named element.
overriding procedure Set_Name_Expression
(Self : not null access UML_Interface_Realization_Proxy;
To : AMF.UML.String_Expressions.UML_String_Expression_Access);
-- Setter of NamedElement::nameExpression.
--
-- The string expression used to define the name of this named element.
overriding function Get_Namespace
(Self : not null access constant UML_Interface_Realization_Proxy)
return AMF.UML.Namespaces.UML_Namespace_Access;
-- Getter of NamedElement::namespace.
--
-- Specifies the namespace that owns the NamedElement.
overriding function Get_Qualified_Name
(Self : not null access constant UML_Interface_Realization_Proxy)
return AMF.Optional_String;
-- Getter of NamedElement::qualifiedName.
--
-- A name which allows the NamedElement to be identified within a
-- hierarchy of nested Namespaces. It is constructed from the names of the
-- containing namespaces starting at the root of the hierarchy and ending
-- with the name of the NamedElement itself.
overriding function Get_Owning_Template_Parameter
(Self : not null access constant UML_Interface_Realization_Proxy)
return AMF.UML.Template_Parameters.UML_Template_Parameter_Access;
-- Getter of ParameterableElement::owningTemplateParameter.
--
-- The formal template parameter that owns this element.
overriding procedure Set_Owning_Template_Parameter
(Self : not null access UML_Interface_Realization_Proxy;
To : AMF.UML.Template_Parameters.UML_Template_Parameter_Access);
-- Setter of ParameterableElement::owningTemplateParameter.
--
-- The formal template parameter that owns this element.
overriding function Get_Template_Parameter
(Self : not null access constant UML_Interface_Realization_Proxy)
return AMF.UML.Template_Parameters.UML_Template_Parameter_Access;
-- Getter of ParameterableElement::templateParameter.
--
-- The template parameter that exposes this element as a formal parameter.
overriding procedure Set_Template_Parameter
(Self : not null access UML_Interface_Realization_Proxy;
To : AMF.UML.Template_Parameters.UML_Template_Parameter_Access);
-- Setter of ParameterableElement::templateParameter.
--
-- The template parameter that exposes this element as a formal parameter.
overriding function All_Owning_Packages
(Self : not null access constant UML_Interface_Realization_Proxy)
return AMF.UML.Packages.Collections.Set_Of_UML_Package;
-- Operation NamedElement::allOwningPackages.
--
-- The query allOwningPackages() returns all the directly or indirectly
-- owning packages.
overriding function Is_Distinguishable_From
(Self : not null access constant UML_Interface_Realization_Proxy;
N : AMF.UML.Named_Elements.UML_Named_Element_Access;
Ns : AMF.UML.Namespaces.UML_Namespace_Access)
return Boolean;
-- Operation NamedElement::isDistinguishableFrom.
--
-- The query isDistinguishableFrom() determines whether two NamedElements
-- may logically co-exist within a Namespace. By default, two named
-- elements are distinguishable if (a) they have unrelated types or (b)
-- they have related types but different names.
overriding function Namespace
(Self : not null access constant UML_Interface_Realization_Proxy)
return AMF.UML.Namespaces.UML_Namespace_Access;
-- Operation NamedElement::namespace.
--
-- Missing derivation for NamedElement::/namespace : Namespace
overriding function Is_Compatible_With
(Self : not null access constant UML_Interface_Realization_Proxy;
P : AMF.UML.Parameterable_Elements.UML_Parameterable_Element_Access)
return Boolean;
-- Operation ParameterableElement::isCompatibleWith.
--
-- The query isCompatibleWith() determines if this parameterable element
-- is compatible with the specified parameterable element. By default
-- parameterable element P is compatible with parameterable element Q if
-- the kind of P is the same or a subtype as the kind of Q. Subclasses
-- should override this operation to specify different compatibility
-- constraints.
overriding function Is_Template_Parameter
(Self : not null access constant UML_Interface_Realization_Proxy)
return Boolean;
-- Operation ParameterableElement::isTemplateParameter.
--
-- The query isTemplateParameter() determines if this parameterable
-- element is exposed as a formal template parameter.
overriding procedure Enter_Element
(Self : not null access constant UML_Interface_Realization_Proxy;
Visitor : in out AMF.Visitors.Abstract_Visitor'Class;
Control : in out AMF.Visitors.Traverse_Control);
-- Dispatch call to corresponding subprogram of visitor interface.
overriding procedure Leave_Element
(Self : not null access constant UML_Interface_Realization_Proxy;
Visitor : in out AMF.Visitors.Abstract_Visitor'Class;
Control : in out AMF.Visitors.Traverse_Control);
-- Dispatch call to corresponding subprogram of visitor interface.
overriding procedure Visit_Element
(Self : not null access constant UML_Interface_Realization_Proxy;
Iterator : in out AMF.Visitors.Abstract_Iterator'Class;
Visitor : in out AMF.Visitors.Abstract_Visitor'Class;
Control : in out AMF.Visitors.Traverse_Control);
-- Dispatch call to corresponding subprogram of iterator interface.
end AMF.Internals.UML_Interface_Realizations;
| 50.592593 | 85 | 0.680753 |
4af84bd3b35534eaefac4759bf1e5664136e203d | 1,920 | adb | Ada | src/ht16k33.adb | JeremyGrosser/sensors | 1efb0da0dd84eed34fdeba6a499d6195d25b8f1b | [
"BSD-3-Clause"
] | 1 | 2022-03-07T11:28:27.000Z | 2022-03-07T11:28:27.000Z | src/ht16k33.adb | JeremyGrosser/sensors | 1efb0da0dd84eed34fdeba6a499d6195d25b8f1b | [
"BSD-3-Clause"
] | null | null | null | src/ht16k33.adb | JeremyGrosser/sensors | 1efb0da0dd84eed34fdeba6a499d6195d25b8f1b | [
"BSD-3-Clause"
] | null | null | null | --
-- Copyright (C) 2021 Jeremy Grosser <[email protected]>
--
-- SPDX-License-Identifier: BSD-3-Clause
--
package body HT16K33 is
procedure Initialize
(This : in out Device)
is
Oscillator_On : constant I2C_Data (1 .. 1) := (1 => 16#21#);
Display_On : constant I2C_Data (1 .. 1) := (1 => 16#81#);
Row_Output : constant I2C_Data (1 .. 1) := (1 => 16#A0#);
Status : I2C_Status := Err_Error;
begin
This.Port.Master_Transmit (This.Address, Oscillator_On, Status, Timeout => 10);
This.Port.Master_Transmit (This.Address, Display_On, Status, Timeout => 10);
This.Port.Master_Transmit (This.Address, Row_Output, Status, Timeout => 10);
Set_Brightness (This, Brightness_Level'Last);
Update (This);
end Initialize;
procedure Set_Brightness
(This : in out Device;
Level : Brightness_Level)
is
Data : constant I2C_Data (1 .. 1) := (1 => 16#E0# or Level);
Status : I2C_Status := Err_Error;
begin
This.Port.Master_Transmit (This.Address, Data, Status, Timeout => 10);
end Set_Brightness;
procedure Update
(This : in out Device)
is
Status : I2C_Status := Err_Error;
begin
This.Port.Master_Transmit (This.Address, This.Buffer, Status, Timeout => 100);
end Update;
procedure Set
(This : in out Device;
Num : Output_Index)
is
Index : constant Positive := (Num / 8) + 1;
begin
This.Buffer (Index) := This.Buffer (Index) or Shift_Left (1, Num mod 8);
end Set;
procedure Clear
(This : in out Device;
Num : Output_Index)
is
Index : constant Positive := (Num / 8) + 1;
begin
This.Buffer (Index) := This.Buffer (Index) and not Shift_Left (1, Num mod 8);
end Clear;
procedure Clear_All
(This : in out Device)
is
begin
This.Buffer := (others => 0);
end Clear_All;
end HT16K33;
| 29.090909 | 85 | 0.6125 |
18b53b91cdb1410051e84b4c9f9b701fe0d23069 | 3,596 | ads | Ada | source/amf/dd/amf-dg-gradients-hash.ads | svn2github/matreshka | 9d222b3ad9da508855fb1f5adbe5e8a4fad4c530 | [
"BSD-3-Clause"
] | 24 | 2016-11-29T06:59:41.000Z | 2021-08-30T11:55:16.000Z | source/amf/dd/amf-dg-gradients-hash.ads | svn2github/matreshka | 9d222b3ad9da508855fb1f5adbe5e8a4fad4c530 | [
"BSD-3-Clause"
] | 2 | 2019-01-16T05:15:20.000Z | 2019-02-03T10:03:32.000Z | source/amf/dd/amf-dg-gradients-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 © 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.DG.Gradients.Hash is
new AMF.Elements.Generic_Hash (DG_Gradient, DG_Gradient_Access);
| 71.92 | 78 | 0.398776 |
cb981f11f031ce0c7d044da5308f613d5c3df358 | 1,444 | ads | Ada | examples/utils/sdl/sdl_sdl_version_h.ads | Fabien-Chouteau/GESTE | 5ac814906fdb49d880db60cbb17279cbbb777336 | [
"BSD-3-Clause"
] | 13 | 2018-07-31T12:11:46.000Z | 2021-11-19T14:16:46.000Z | examples/utils/sdl/sdl_sdl_version_h.ads | gregkrsak/GESTE | 5ac814906fdb49d880db60cbb17279cbbb777336 | [
"BSD-3-Clause"
] | 1 | 2018-10-22T21:41:59.000Z | 2018-10-22T21:41:59.000Z | examples/utils/sdl/sdl_sdl_version_h.ads | gregkrsak/GESTE | 5ac814906fdb49d880db60cbb17279cbbb777336 | [
"BSD-3-Clause"
] | 4 | 2020-07-03T10:03:13.000Z | 2022-02-10T03:35:07.000Z | pragma Ada_2005;
pragma Style_Checks (Off);
with Interfaces.C; use Interfaces.C;
with SDL_SDL_stdinc_h;
with System;
package SDL_SDL_version_h is
SDL_MAJOR_VERSION : constant := 1; -- ../include/SDL/SDL_version.h:42
SDL_MINOR_VERSION : constant := 2; -- ../include/SDL/SDL_version.h:43
SDL_PATCHLEVEL : constant := 15; -- ../include/SDL/SDL_version.h:44
-- arg-macro: procedure SDL_VERSION (X)
-- { (X).major := SDL_MAJOR_VERSION; (X).minor := SDL_MINOR_VERSION; (X).patch := SDL_PATCHLEVEL; }
-- arg-macro: function SDL_VERSIONNUM (X, Y, Z)
-- return (X)*1000 + (Y)*100 + (Z);
-- unsupported macro: SDL_COMPILEDVERSION SDL_VERSIONNUM(SDL_MAJOR_VERSION, SDL_MINOR_VERSION, SDL_PATCHLEVEL)
-- arg-macro: function SDL_VERSION_ATLEAST (X, Y, Z)
-- return SDL_COMPILEDVERSION >= SDL_VERSIONNUM(X, Y, Z);
type SDL_version is record
major : aliased SDL_SDL_stdinc_h.Uint8; -- ../include/SDL/SDL_version.h:48
minor : aliased SDL_SDL_stdinc_h.Uint8; -- ../include/SDL/SDL_version.h:49
patch : aliased SDL_SDL_stdinc_h.Uint8; -- ../include/SDL/SDL_version.h:50
end record;
pragma Convention (C_Pass_By_Copy, SDL_version); -- ../include/SDL/SDL_version.h:47
function SDL_Linked_Version return System.Address; -- ../include/SDL/SDL_version.h:83
pragma Import (C, SDL_Linked_Version, "SDL_Linked_Version");
end SDL_SDL_version_h;
| 43.757576 | 115 | 0.689058 |
cb9b05d4bae20af047578edacad7a542539302a8 | 3,332 | adb | Ada | src/latin_utils/latin_utils-strings_package.adb | Alex-Vasile/whitakers-words | 9fa16606d97842746fea0379839f40c959c53d56 | [
"FTL"
] | 204 | 2015-06-12T21:22:55.000Z | 2022-03-28T10:50:16.000Z | src/latin_utils/latin_utils-strings_package.adb | Alex-Vasile/whitakers-words | 9fa16606d97842746fea0379839f40c959c53d56 | [
"FTL"
] | 98 | 2015-06-15T22:17:04.000Z | 2021-10-01T18:17:55.000Z | src/latin_utils/latin_utils-strings_package.adb | Alex-Vasile/whitakers-words | 9fa16606d97842746fea0379839f40c959c53d56 | [
"FTL"
] | 50 | 2015-06-16T22:42:24.000Z | 2021-12-29T16:53:08.000Z | -- 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 Ada.Characters.Handling;
with Ada.Strings.Fixed;
with Ada.Text_IO; use Ada.Text_IO;
package body Latin_Utils.Strings_Package is
---------------------------------------------------------------------------
function Lower_Case (C : Character) return Character
renames Ada.Characters.Handling.To_Lower;
function Lower_Case (S : String) return String
renames Ada.Characters.Handling.To_Lower;
function Upper_Case (C : Character) return Character
renames Ada.Characters.Handling.To_Upper;
function Upper_Case (S : String) return String
renames Ada.Characters.Handling.To_Upper;
---------------------------------------------------------------------------
function Trim
(Source : in String;
Side : in Trim_End := Both
) return String
is
begin
return Ada.Strings.Fixed.Trim (Source, Ada.Strings.Trim_End (Side));
end Trim;
---------------------------------------------------------------------------
function Head
(Source : in String;
Count : in Natural
) return String is
begin
return Ada.Strings.Fixed.Head (Source, Count, ' ');
end Head;
---------------------------------------------------------------------------
procedure Get_Non_Comment_Line
(File : in Ada.Text_IO.File_Type;
Item : out String;
Last : out Integer
) is
Line : String (1 .. 250) := (others => ' ');
Length, LX : Integer := 0;
-- LX is Line (Line'First .. Start_Of_Comment)'Length
begin
Last := 0;
-- Loop until data - Finish on EOF
File_Loop :
while not Ada.Text_IO.End_Of_File (File) loop
Ada.Text_IO.Get_Line (File, Line, Length);
declare
Trimmed_Head : constant String := Head (Trim (Line), 250)(1 .. 2);
begin
if Trimmed_Head (1) = Character'Val (13) then
exit File_Loop;
end if;
if Trimmed_Head = "--" then
null;
else
-- Search for start of comment in line (if any).
LX := Ada.Strings.Fixed.Index (Line, "--", Line'First);
if LX /= 0 then
LX := LX - 1;
else
LX := Length;
end if;
exit File_Loop;
end if;
end;
end loop File_Loop;
Item (Item'First .. LX) := Line (1 .. LX);
Last := LX;
end Get_Non_Comment_Line;
---------------------------------------------------------------------------
end Latin_Utils.Strings_Package;
| 31.733333 | 78 | 0.541417 |
4a7db0d990d0d9f5aea993f1d9fde84d0b59b374 | 5,125 | ads | Ada | source/amf/uml/amf-umldi-holders.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-holders.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-holders.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 League.Holders;
package AMF.UMLDI.Holders is
pragma Preelaborate;
-- UMLAssociationOrConnectorOrLinkShapeKind [0..1]
function Element
(Holder : League.Holders.Holder)
return AMF.UMLDI.Optional_UMLDI_UML_Association_Or_Connector_Or_Link_Shape_Kind;
function To_Holder
(Element : AMF.UMLDI.Optional_UMLDI_UML_Association_Or_Connector_Or_Link_Shape_Kind)
return League.Holders.Holder;
-- UMLInheritedStateBorderKind [0..1]
function Element
(Holder : League.Holders.Holder)
return AMF.UMLDI.Optional_UMLDI_UML_Inherited_State_Border_Kind;
function To_Holder
(Element : AMF.UMLDI.Optional_UMLDI_UML_Inherited_State_Border_Kind)
return League.Holders.Holder;
-- UMLInteractionDiagramKind [0..1]
function Element
(Holder : League.Holders.Holder)
return AMF.UMLDI.Optional_UMLDI_UML_Interaction_Diagram_Kind;
function To_Holder
(Element : AMF.UMLDI.Optional_UMLDI_UML_Interaction_Diagram_Kind)
return League.Holders.Holder;
-- UMLInteractionTableLabelKind [0..1]
function Element
(Holder : League.Holders.Holder)
return AMF.UMLDI.Optional_UMLDI_UML_Interaction_Table_Label_Kind;
function To_Holder
(Element : AMF.UMLDI.Optional_UMLDI_UML_Interaction_Table_Label_Kind)
return League.Holders.Holder;
-- UMLNavigabilityNotationKind [0..1]
function Element
(Holder : League.Holders.Holder)
return AMF.UMLDI.Optional_UMLDI_UML_Navigability_Notation_Kind;
function To_Holder
(Element : AMF.UMLDI.Optional_UMLDI_UML_Navigability_Notation_Kind)
return League.Holders.Holder;
end AMF.UMLDI.Holders;
| 52.295918 | 88 | 0.507902 |
0ecf2d4b8018f5351dffe658b4966137c9d46f6b | 49,734 | adb | Ada | hls_video_block/solution1/.autopilot/db/rgb2gry.sched.adb | parker-xilinx/HLS_2d_filter | 25c85715167623c07bd5f06a8747961cdafee616 | [
"Unlicense"
] | 1 | 2019-12-22T12:22:36.000Z | 2019-12-22T12:22:36.000Z | hls_video_block/solution1/.autopilot/db/rgb2gry.sched.adb | parker-xilinx/HLS_2d_filter | 25c85715167623c07bd5f06a8747961cdafee616 | [
"Unlicense"
] | null | null | null | hls_video_block/solution1/.autopilot/db/rgb2gry.sched.adb | parker-xilinx/HLS_2d_filter | 25c85715167623c07bd5f06a8747961cdafee616 | [
"Unlicense"
] | 2 | 2019-12-22T12:22:38.000Z | 2021-04-30T00:59:20.000Z | <?xml version="1.0" encoding="UTF-8" standalone="yes" ?>
<!DOCTYPE boost_serialization>
<boost_serialization signature="serialization::archive" version="15">
<syndb class_id="0" tracking_level="0" version="0">
<userIPLatency>-1</userIPLatency>
<userIPName></userIPName>
<cdfg class_id="1" tracking_level="1" version="0" object_id="_0">
<name>rgb2gry</name>
<ret_bitwidth>0</ret_bitwidth>
<ports class_id="2" tracking_level="0" version="0">
<count>2</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>input_mat_data_V</name>
<fileName></fileName>
<fileDirectory></fileDirectory>
<lineNumber>0</lineNumber>
<contextFuncName></contextFuncName>
<inlineStackInfo class_id="6" tracking_level="0" version="0">
<count>0</count>
<item_version>0</item_version>
</inlineStackInfo>
<originalName>input_mat.data.V</originalName>
<rtlName></rtlName>
<coreName></coreName>
</Obj>
<bitwidth>24</bitwidth>
</Value>
<direction>0</direction>
<if_type>3</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>output_mat_data_V</name>
<fileName></fileName>
<fileDirectory></fileDirectory>
<lineNumber>0</lineNumber>
<contextFuncName></contextFuncName>
<inlineStackInfo>
<count>0</count>
<item_version>0</item_version>
</inlineStackInfo>
<originalName>output_mat.data.V</originalName>
<rtlName></rtlName>
<coreName></coreName>
</Obj>
<bitwidth>7</bitwidth>
</Value>
<direction>1</direction>
<if_type>3</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>18</count>
<item_version>0</item_version>
<item class_id="9" tracking_level="1" version="0" object_id="_3">
<Value>
<Obj>
<type>0</type>
<id>5</id>
<name></name>
<fileName>hls_video_block.cpp</fileName>
<fileDirectory>C:\Users\parkerh\Documents\2d_filter_xfopencv</fileDirectory>
<lineNumber>128</lineNumber>
<contextFuncName>rgb2gry</contextFuncName>
<inlineStackInfo>
<count>1</count>
<item_version>0</item_version>
<item class_id="10" tracking_level="0" version="0">
<first>C:\Users\parkerh\Documents\2d_filter_xfopencv</first>
<second class_id="11" tracking_level="0" version="0">
<count>1</count>
<item_version>0</item_version>
<item class_id="12" tracking_level="0" version="0">
<first class_id="13" tracking_level="0" version="0">
<first>hls_video_block.cpp</first>
<second>rgb2gry</second>
</first>
<second>128</second>
</item>
</second>
</item>
</inlineStackInfo>
<originalName></originalName>
<rtlName></rtlName>
<coreName></coreName>
</Obj>
<bitwidth>0</bitwidth>
</Value>
<oprand_edges>
<count>1</count>
<item_version>0</item_version>
<item>30</item>
</oprand_edges>
<opcode>br</opcode>
<m_Display>0</m_Display>
<m_isOnCriticalPath>0</m_isOnCriticalPath>
<m_isLCDNode>0</m_isLCDNode>
<m_isStartOfPath>0</m_isStartOfPath>
<m_delay>0.65</m_delay>
<m_topoIndex>1</m_topoIndex>
<m_clusterGroupNumber>-1</m_clusterGroupNumber>
</item>
<item class_id_reference="9" object_id="_4">
<Value>
<Obj>
<type>0</type>
<id>7</id>
<name>indvar_flatten</name>
<fileName></fileName>
<fileDirectory></fileDirectory>
<lineNumber>0</lineNumber>
<contextFuncName></contextFuncName>
<inlineStackInfo>
<count>0</count>
<item_version>0</item_version>
</inlineStackInfo>
<originalName></originalName>
<rtlName></rtlName>
<coreName></coreName>
</Obj>
<bitwidth>20</bitwidth>
</Value>
<oprand_edges>
<count>4</count>
<item_version>0</item_version>
<item>32</item>
<item>33</item>
<item>34</item>
<item>35</item>
</oprand_edges>
<opcode>phi</opcode>
<m_Display>0</m_Display>
<m_isOnCriticalPath>0</m_isOnCriticalPath>
<m_isLCDNode>0</m_isLCDNode>
<m_isStartOfPath>0</m_isStartOfPath>
<m_delay>0.00</m_delay>
<m_topoIndex>2</m_topoIndex>
<m_clusterGroupNumber>-1</m_clusterGroupNumber>
</item>
<item class_id_reference="9" object_id="_5">
<Value>
<Obj>
<type>0</type>
<id>8</id>
<name>exitcond_flatten</name>
<fileName></fileName>
<fileDirectory></fileDirectory>
<lineNumber>0</lineNumber>
<contextFuncName></contextFuncName>
<inlineStackInfo>
<count>0</count>
<item_version>0</item_version>
</inlineStackInfo>
<originalName></originalName>
<rtlName></rtlName>
<coreName></coreName>
</Obj>
<bitwidth>1</bitwidth>
</Value>
<oprand_edges>
<count>2</count>
<item_version>0</item_version>
<item>36</item>
<item>38</item>
</oprand_edges>
<opcode>icmp</opcode>
<m_Display>0</m_Display>
<m_isOnCriticalPath>0</m_isOnCriticalPath>
<m_isLCDNode>0</m_isLCDNode>
<m_isStartOfPath>0</m_isStartOfPath>
<m_delay>1.07</m_delay>
<m_topoIndex>3</m_topoIndex>
<m_clusterGroupNumber>-1</m_clusterGroupNumber>
</item>
<item class_id_reference="9" object_id="_6">
<Value>
<Obj>
<type>0</type>
<id>9</id>
<name>indvar_flatten_next</name>
<fileName></fileName>
<fileDirectory></fileDirectory>
<lineNumber>0</lineNumber>
<contextFuncName></contextFuncName>
<inlineStackInfo>
<count>0</count>
<item_version>0</item_version>
</inlineStackInfo>
<originalName></originalName>
<rtlName></rtlName>
<coreName></coreName>
</Obj>
<bitwidth>20</bitwidth>
</Value>
<oprand_edges>
<count>2</count>
<item_version>0</item_version>
<item>39</item>
<item>41</item>
</oprand_edges>
<opcode>add</opcode>
<m_Display>0</m_Display>
<m_isOnCriticalPath>0</m_isOnCriticalPath>
<m_isLCDNode>0</m_isLCDNode>
<m_isStartOfPath>0</m_isStartOfPath>
<m_delay>0.89</m_delay>
<m_topoIndex>4</m_topoIndex>
<m_clusterGroupNumber>-1</m_clusterGroupNumber>
</item>
<item class_id_reference="9" object_id="_7">
<Value>
<Obj>
<type>0</type>
<id>10</id>
<name></name>
<fileName></fileName>
<fileDirectory></fileDirectory>
<lineNumber>0</lineNumber>
<contextFuncName></contextFuncName>
<inlineStackInfo>
<count>0</count>
<item_version>0</item_version>
</inlineStackInfo>
<originalName></originalName>
<rtlName></rtlName>
<coreName></coreName>
</Obj>
<bitwidth>0</bitwidth>
</Value>
<oprand_edges>
<count>3</count>
<item_version>0</item_version>
<item>42</item>
<item>43</item>
<item>44</item>
</oprand_edges>
<opcode>br</opcode>
<m_Display>0</m_Display>
<m_isOnCriticalPath>0</m_isOnCriticalPath>
<m_isLCDNode>0</m_isLCDNode>
<m_isStartOfPath>0</m_isStartOfPath>
<m_delay>0.00</m_delay>
<m_topoIndex>5</m_topoIndex>
<m_clusterGroupNumber>-1</m_clusterGroupNumber>
</item>
<item class_id_reference="9" object_id="_8">
<Value>
<Obj>
<type>0</type>
<id>14</id>
<name>input_pixel_V</name>
<fileName>hls_video_block.cpp</fileName>
<fileDirectory>C:\Users\parkerh\Documents\2d_filter_xfopencv</fileDirectory>
<lineNumber>131</lineNumber>
<contextFuncName>rgb2gry</contextFuncName>
<inlineStackInfo>
<count>1</count>
<item_version>0</item_version>
<item>
<first>C:\Users\parkerh\Documents\2d_filter_xfopencv</first>
<second>
<count>1</count>
<item_version>0</item_version>
<item>
<first>
<first>hls_video_block.cpp</first>
<second>rgb2gry</second>
</first>
<second>131</second>
</item>
</second>
</item>
</inlineStackInfo>
<originalName>input_pixel.V</originalName>
<rtlName></rtlName>
<coreName></coreName>
</Obj>
<bitwidth>24</bitwidth>
</Value>
<oprand_edges>
<count>2</count>
<item_version>0</item_version>
<item>46</item>
<item>47</item>
</oprand_edges>
<opcode>read</opcode>
<m_Display>0</m_Display>
<m_isOnCriticalPath>0</m_isOnCriticalPath>
<m_isLCDNode>0</m_isLCDNode>
<m_isStartOfPath>0</m_isStartOfPath>
<m_delay>1.83</m_delay>
<m_topoIndex>6</m_topoIndex>
<m_clusterGroupNumber>-1</m_clusterGroupNumber>
</item>
<item class_id_reference="9" object_id="_9">
<Value>
<Obj>
<type>0</type>
<id>15</id>
<name>tmp</name>
<fileName>hls_video_block.cpp</fileName>
<fileDirectory>C:\Users\parkerh\Documents\2d_filter_xfopencv</fileDirectory>
<lineNumber>136</lineNumber>
<contextFuncName>rgb2gry</contextFuncName>
<inlineStackInfo>
<count>1</count>
<item_version>0</item_version>
<item>
<first>C:\Users\parkerh\Documents\2d_filter_xfopencv</first>
<second>
<count>1</count>
<item_version>0</item_version>
<item>
<first>
<first>hls_video_block.cpp</first>
<second>rgb2gry</second>
</first>
<second>136</second>
</item>
</second>
</item>
</inlineStackInfo>
<originalName></originalName>
<rtlName></rtlName>
<coreName></coreName>
</Obj>
<bitwidth>5</bitwidth>
</Value>
<oprand_edges>
<count>4</count>
<item_version>0</item_version>
<item>49</item>
<item>50</item>
<item>52</item>
<item>54</item>
</oprand_edges>
<opcode>partselect</opcode>
<m_Display>0</m_Display>
<m_isOnCriticalPath>0</m_isOnCriticalPath>
<m_isLCDNode>0</m_isLCDNode>
<m_isStartOfPath>0</m_isStartOfPath>
<m_delay>0.00</m_delay>
<m_topoIndex>7</m_topoIndex>
<m_clusterGroupNumber>-1</m_clusterGroupNumber>
</item>
<item class_id_reference="9" object_id="_10">
<Value>
<Obj>
<type>0</type>
<id>16</id>
<name>tmp_3_cast</name>
<fileName>hls_video_block.cpp</fileName>
<fileDirectory>C:\Users\parkerh\Documents\2d_filter_xfopencv</fileDirectory>
<lineNumber>136</lineNumber>
<contextFuncName>rgb2gry</contextFuncName>
<inlineStackInfo>
<count>1</count>
<item_version>0</item_version>
<item>
<first>C:\Users\parkerh\Documents\2d_filter_xfopencv</first>
<second>
<count>1</count>
<item_version>0</item_version>
<item>
<first>
<first>hls_video_block.cpp</first>
<second>rgb2gry</second>
</first>
<second>136</second>
</item>
</second>
</item>
</inlineStackInfo>
<originalName></originalName>
<rtlName></rtlName>
<coreName></coreName>
</Obj>
<bitwidth>6</bitwidth>
</Value>
<oprand_edges>
<count>1</count>
<item_version>0</item_version>
<item>55</item>
</oprand_edges>
<opcode>zext</opcode>
<m_Display>0</m_Display>
<m_isOnCriticalPath>0</m_isOnCriticalPath>
<m_isLCDNode>0</m_isLCDNode>
<m_isStartOfPath>0</m_isStartOfPath>
<m_delay>0.00</m_delay>
<m_topoIndex>8</m_topoIndex>
<m_clusterGroupNumber>-1</m_clusterGroupNumber>
</item>
<item class_id_reference="9" object_id="_11">
<Value>
<Obj>
<type>0</type>
<id>17</id>
<name>tmp_2</name>
<fileName>hls_video_block.cpp</fileName>
<fileDirectory>C:\Users\parkerh\Documents\2d_filter_xfopencv</fileDirectory>
<lineNumber>136</lineNumber>
<contextFuncName>rgb2gry</contextFuncName>
<inlineStackInfo>
<count>1</count>
<item_version>0</item_version>
<item>
<first>C:\Users\parkerh\Documents\2d_filter_xfopencv</first>
<second>
<count>1</count>
<item_version>0</item_version>
<item>
<first>
<first>hls_video_block.cpp</first>
<second>rgb2gry</second>
</first>
<second>136</second>
</item>
</second>
</item>
</inlineStackInfo>
<originalName></originalName>
<rtlName></rtlName>
<coreName></coreName>
</Obj>
<bitwidth>5</bitwidth>
</Value>
<oprand_edges>
<count>4</count>
<item_version>0</item_version>
<item>56</item>
<item>57</item>
<item>59</item>
<item>61</item>
</oprand_edges>
<opcode>partselect</opcode>
<m_Display>0</m_Display>
<m_isOnCriticalPath>0</m_isOnCriticalPath>
<m_isLCDNode>0</m_isLCDNode>
<m_isStartOfPath>0</m_isStartOfPath>
<m_delay>0.00</m_delay>
<m_topoIndex>9</m_topoIndex>
<m_clusterGroupNumber>-1</m_clusterGroupNumber>
</item>
<item class_id_reference="9" object_id="_12">
<Value>
<Obj>
<type>0</type>
<id>18</id>
<name>tmp_4_cast</name>
<fileName>hls_video_block.cpp</fileName>
<fileDirectory>C:\Users\parkerh\Documents\2d_filter_xfopencv</fileDirectory>
<lineNumber>136</lineNumber>
<contextFuncName>rgb2gry</contextFuncName>
<inlineStackInfo>
<count>1</count>
<item_version>0</item_version>
<item>
<first>C:\Users\parkerh\Documents\2d_filter_xfopencv</first>
<second>
<count>1</count>
<item_version>0</item_version>
<item>
<first>
<first>hls_video_block.cpp</first>
<second>rgb2gry</second>
</first>
<second>136</second>
</item>
</second>
</item>
</inlineStackInfo>
<originalName></originalName>
<rtlName></rtlName>
<coreName></coreName>
</Obj>
<bitwidth>6</bitwidth>
</Value>
<oprand_edges>
<count>1</count>
<item_version>0</item_version>
<item>62</item>
</oprand_edges>
<opcode>zext</opcode>
<m_Display>0</m_Display>
<m_isOnCriticalPath>0</m_isOnCriticalPath>
<m_isLCDNode>0</m_isLCDNode>
<m_isStartOfPath>0</m_isStartOfPath>
<m_delay>0.00</m_delay>
<m_topoIndex>10</m_topoIndex>
<m_clusterGroupNumber>-1</m_clusterGroupNumber>
</item>
<item class_id_reference="9" object_id="_13">
<Value>
<Obj>
<type>0</type>
<id>19</id>
<name>tmp_3</name>
<fileName>hls_video_block.cpp</fileName>
<fileDirectory>C:\Users\parkerh\Documents\2d_filter_xfopencv</fileDirectory>
<lineNumber>136</lineNumber>
<contextFuncName>rgb2gry</contextFuncName>
<inlineStackInfo>
<count>1</count>
<item_version>0</item_version>
<item>
<first>C:\Users\parkerh\Documents\2d_filter_xfopencv</first>
<second>
<count>1</count>
<item_version>0</item_version>
<item>
<first>
<first>hls_video_block.cpp</first>
<second>rgb2gry</second>
</first>
<second>136</second>
</item>
</second>
</item>
</inlineStackInfo>
<originalName></originalName>
<rtlName></rtlName>
<coreName></coreName>
</Obj>
<bitwidth>5</bitwidth>
</Value>
<oprand_edges>
<count>4</count>
<item_version>0</item_version>
<item>63</item>
<item>64</item>
<item>66</item>
<item>68</item>
</oprand_edges>
<opcode>partselect</opcode>
<m_Display>0</m_Display>
<m_isOnCriticalPath>0</m_isOnCriticalPath>
<m_isLCDNode>0</m_isLCDNode>
<m_isStartOfPath>0</m_isStartOfPath>
<m_delay>0.00</m_delay>
<m_topoIndex>11</m_topoIndex>
<m_clusterGroupNumber>-1</m_clusterGroupNumber>
</item>
<item class_id_reference="9" object_id="_14">
<Value>
<Obj>
<type>0</type>
<id>20</id>
<name>tmp_5_cast</name>
<fileName>hls_video_block.cpp</fileName>
<fileDirectory>C:\Users\parkerh\Documents\2d_filter_xfopencv</fileDirectory>
<lineNumber>136</lineNumber>
<contextFuncName>rgb2gry</contextFuncName>
<inlineStackInfo>
<count>1</count>
<item_version>0</item_version>
<item>
<first>C:\Users\parkerh\Documents\2d_filter_xfopencv</first>
<second>
<count>1</count>
<item_version>0</item_version>
<item>
<first>
<first>hls_video_block.cpp</first>
<second>rgb2gry</second>
</first>
<second>136</second>
</item>
</second>
</item>
</inlineStackInfo>
<originalName></originalName>
<rtlName></rtlName>
<coreName></coreName>
</Obj>
<bitwidth>7</bitwidth>
</Value>
<oprand_edges>
<count>1</count>
<item_version>0</item_version>
<item>69</item>
</oprand_edges>
<opcode>zext</opcode>
<m_Display>0</m_Display>
<m_isOnCriticalPath>0</m_isOnCriticalPath>
<m_isLCDNode>0</m_isLCDNode>
<m_isStartOfPath>0</m_isStartOfPath>
<m_delay>0.00</m_delay>
<m_topoIndex>12</m_topoIndex>
<m_clusterGroupNumber>-1</m_clusterGroupNumber>
</item>
<item class_id_reference="9" object_id="_15">
<Value>
<Obj>
<type>0</type>
<id>21</id>
<name>tmp_6</name>
<fileName>hls_video_block.cpp</fileName>
<fileDirectory>C:\Users\parkerh\Documents\2d_filter_xfopencv</fileDirectory>
<lineNumber>136</lineNumber>
<contextFuncName>rgb2gry</contextFuncName>
<inlineStackInfo>
<count>1</count>
<item_version>0</item_version>
<item>
<first>C:\Users\parkerh\Documents\2d_filter_xfopencv</first>
<second>
<count>1</count>
<item_version>0</item_version>
<item>
<first>
<first>hls_video_block.cpp</first>
<second>rgb2gry</second>
</first>
<second>136</second>
</item>
</second>
</item>
</inlineStackInfo>
<originalName></originalName>
<rtlName></rtlName>
<coreName></coreName>
</Obj>
<bitwidth>6</bitwidth>
</Value>
<oprand_edges>
<count>2</count>
<item_version>0</item_version>
<item>70</item>
<item>71</item>
</oprand_edges>
<opcode>add</opcode>
<m_Display>0</m_Display>
<m_isOnCriticalPath>0</m_isOnCriticalPath>
<m_isLCDNode>0</m_isLCDNode>
<m_isStartOfPath>0</m_isStartOfPath>
<m_delay>0.78</m_delay>
<m_topoIndex>13</m_topoIndex>
<m_clusterGroupNumber>-1</m_clusterGroupNumber>
</item>
<item class_id_reference="9" object_id="_16">
<Value>
<Obj>
<type>0</type>
<id>22</id>
<name>tmp_6_cast</name>
<fileName>hls_video_block.cpp</fileName>
<fileDirectory>C:\Users\parkerh\Documents\2d_filter_xfopencv</fileDirectory>
<lineNumber>136</lineNumber>
<contextFuncName>rgb2gry</contextFuncName>
<inlineStackInfo>
<count>1</count>
<item_version>0</item_version>
<item>
<first>C:\Users\parkerh\Documents\2d_filter_xfopencv</first>
<second>
<count>1</count>
<item_version>0</item_version>
<item>
<first>
<first>hls_video_block.cpp</first>
<second>rgb2gry</second>
</first>
<second>136</second>
</item>
</second>
</item>
</inlineStackInfo>
<originalName></originalName>
<rtlName></rtlName>
<coreName></coreName>
</Obj>
<bitwidth>7</bitwidth>
</Value>
<oprand_edges>
<count>1</count>
<item_version>0</item_version>
<item>72</item>
</oprand_edges>
<opcode>zext</opcode>
<m_Display>0</m_Display>
<m_isOnCriticalPath>0</m_isOnCriticalPath>
<m_isLCDNode>0</m_isLCDNode>
<m_isStartOfPath>0</m_isStartOfPath>
<m_delay>0.00</m_delay>
<m_topoIndex>14</m_topoIndex>
<m_clusterGroupNumber>-1</m_clusterGroupNumber>
</item>
<item class_id_reference="9" object_id="_17">
<Value>
<Obj>
<type>0</type>
<id>23</id>
<name>p_s</name>
<fileName>hls_video_block.cpp</fileName>
<fileDirectory>C:\Users\parkerh\Documents\2d_filter_xfopencv</fileDirectory>
<lineNumber>136</lineNumber>
<contextFuncName>rgb2gry</contextFuncName>
<inlineStackInfo>
<count>1</count>
<item_version>0</item_version>
<item>
<first>C:\Users\parkerh\Documents\2d_filter_xfopencv</first>
<second>
<count>1</count>
<item_version>0</item_version>
<item>
<first>
<first>hls_video_block.cpp</first>
<second>rgb2gry</second>
</first>
<second>136</second>
</item>
</second>
</item>
</inlineStackInfo>
<originalName></originalName>
<rtlName></rtlName>
<coreName></coreName>
</Obj>
<bitwidth>7</bitwidth>
</Value>
<oprand_edges>
<count>2</count>
<item_version>0</item_version>
<item>73</item>
<item>74</item>
</oprand_edges>
<opcode>add</opcode>
<m_Display>0</m_Display>
<m_isOnCriticalPath>0</m_isOnCriticalPath>
<m_isLCDNode>0</m_isLCDNode>
<m_isStartOfPath>0</m_isStartOfPath>
<m_delay>0.78</m_delay>
<m_topoIndex>15</m_topoIndex>
<m_clusterGroupNumber>-1</m_clusterGroupNumber>
</item>
<item class_id_reference="9" object_id="_18">
<Value>
<Obj>
<type>0</type>
<id>24</id>
<name></name>
<fileName>hls_video_block.cpp</fileName>
<fileDirectory>C:\Users\parkerh\Documents\2d_filter_xfopencv</fileDirectory>
<lineNumber>136</lineNumber>
<contextFuncName>rgb2gry</contextFuncName>
<inlineStackInfo>
<count>1</count>
<item_version>0</item_version>
<item>
<first>C:\Users\parkerh\Documents\2d_filter_xfopencv</first>
<second>
<count>1</count>
<item_version>0</item_version>
<item>
<first>
<first>hls_video_block.cpp</first>
<second>rgb2gry</second>
</first>
<second>136</second>
</item>
</second>
</item>
</inlineStackInfo>
<originalName></originalName>
<rtlName></rtlName>
<coreName></coreName>
</Obj>
<bitwidth>0</bitwidth>
</Value>
<oprand_edges>
<count>3</count>
<item_version>0</item_version>
<item>76</item>
<item>77</item>
<item>78</item>
</oprand_edges>
<opcode>write</opcode>
<m_Display>0</m_Display>
<m_isOnCriticalPath>0</m_isOnCriticalPath>
<m_isLCDNode>0</m_isLCDNode>
<m_isStartOfPath>0</m_isStartOfPath>
<m_delay>1.83</m_delay>
<m_topoIndex>16</m_topoIndex>
<m_clusterGroupNumber>-1</m_clusterGroupNumber>
</item>
<item class_id_reference="9" object_id="_19">
<Value>
<Obj>
<type>0</type>
<id>26</id>
<name></name>
<fileName>hls_video_block.cpp</fileName>
<fileDirectory>C:\Users\parkerh\Documents\2d_filter_xfopencv</fileDirectory>
<lineNumber>129</lineNumber>
<contextFuncName>rgb2gry</contextFuncName>
<inlineStackInfo>
<count>1</count>
<item_version>0</item_version>
<item>
<first>C:\Users\parkerh\Documents\2d_filter_xfopencv</first>
<second>
<count>1</count>
<item_version>0</item_version>
<item>
<first>
<first>hls_video_block.cpp</first>
<second>rgb2gry</second>
</first>
<second>129</second>
</item>
</second>
</item>
</inlineStackInfo>
<originalName></originalName>
<rtlName></rtlName>
<coreName></coreName>
</Obj>
<bitwidth>0</bitwidth>
</Value>
<oprand_edges>
<count>1</count>
<item_version>0</item_version>
<item>79</item>
</oprand_edges>
<opcode>br</opcode>
<m_Display>0</m_Display>
<m_isOnCriticalPath>0</m_isOnCriticalPath>
<m_isLCDNode>0</m_isLCDNode>
<m_isStartOfPath>0</m_isStartOfPath>
<m_delay>0.00</m_delay>
<m_topoIndex>17</m_topoIndex>
<m_clusterGroupNumber>-1</m_clusterGroupNumber>
</item>
<item class_id_reference="9" object_id="_20">
<Value>
<Obj>
<type>0</type>
<id>28</id>
<name></name>
<fileName>hls_video_block.cpp</fileName>
<fileDirectory>C:\Users\parkerh\Documents\2d_filter_xfopencv</fileDirectory>
<lineNumber>139</lineNumber>
<contextFuncName>rgb2gry</contextFuncName>
<inlineStackInfo>
<count>1</count>
<item_version>0</item_version>
<item>
<first>C:\Users\parkerh\Documents\2d_filter_xfopencv</first>
<second>
<count>1</count>
<item_version>0</item_version>
<item>
<first>
<first>hls_video_block.cpp</first>
<second>rgb2gry</second>
</first>
<second>139</second>
</item>
</second>
</item>
</inlineStackInfo>
<originalName></originalName>
<rtlName></rtlName>
<coreName></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>
<m_isOnCriticalPath>0</m_isOnCriticalPath>
<m_isLCDNode>0</m_isLCDNode>
<m_isStartOfPath>0</m_isStartOfPath>
<m_delay>0.00</m_delay>
<m_topoIndex>18</m_topoIndex>
<m_clusterGroupNumber>-1</m_clusterGroupNumber>
</item>
</nodes>
<consts class_id="15" tracking_level="0" version="0">
<count>9</count>
<item_version>0</item_version>
<item class_id="16" tracking_level="1" version="0" object_id="_21">
<Value>
<Obj>
<type>2</type>
<id>31</id>
<name>empty</name>
<fileName></fileName>
<fileDirectory></fileDirectory>
<lineNumber>0</lineNumber>
<contextFuncName></contextFuncName>
<inlineStackInfo>
<count>0</count>
<item_version>0</item_version>
</inlineStackInfo>
<originalName></originalName>
<rtlName></rtlName>
<coreName></coreName>
</Obj>
<bitwidth>20</bitwidth>
</Value>
<const_type>0</const_type>
<content>0</content>
</item>
<item class_id_reference="16" object_id="_22">
<Value>
<Obj>
<type>2</type>
<id>37</id>
<name>empty</name>
<fileName></fileName>
<fileDirectory></fileDirectory>
<lineNumber>0</lineNumber>
<contextFuncName></contextFuncName>
<inlineStackInfo>
<count>0</count>
<item_version>0</item_version>
</inlineStackInfo>
<originalName></originalName>
<rtlName></rtlName>
<coreName></coreName>
</Obj>
<bitwidth>20</bitwidth>
</Value>
<const_type>0</const_type>
<content>921600</content>
</item>
<item class_id_reference="16" object_id="_23">
<Value>
<Obj>
<type>2</type>
<id>40</id>
<name>empty</name>
<fileName></fileName>
<fileDirectory></fileDirectory>
<lineNumber>0</lineNumber>
<contextFuncName></contextFuncName>
<inlineStackInfo>
<count>0</count>
<item_version>0</item_version>
</inlineStackInfo>
<originalName></originalName>
<rtlName></rtlName>
<coreName></coreName>
</Obj>
<bitwidth>20</bitwidth>
</Value>
<const_type>0</const_type>
<content>1</content>
</item>
<item class_id_reference="16" object_id="_24">
<Value>
<Obj>
<type>2</type>
<id>51</id>
<name>empty</name>
<fileName></fileName>
<fileDirectory></fileDirectory>
<lineNumber>0</lineNumber>
<contextFuncName></contextFuncName>
<inlineStackInfo>
<count>0</count>
<item_version>0</item_version>
</inlineStackInfo>
<originalName></originalName>
<rtlName></rtlName>
<coreName></coreName>
</Obj>
<bitwidth>32</bitwidth>
</Value>
<const_type>0</const_type>
<content>3</content>
</item>
<item class_id_reference="16" object_id="_25">
<Value>
<Obj>
<type>2</type>
<id>53</id>
<name>empty</name>
<fileName></fileName>
<fileDirectory></fileDirectory>
<lineNumber>0</lineNumber>
<contextFuncName></contextFuncName>
<inlineStackInfo>
<count>0</count>
<item_version>0</item_version>
</inlineStackInfo>
<originalName></originalName>
<rtlName></rtlName>
<coreName></coreName>
</Obj>
<bitwidth>32</bitwidth>
</Value>
<const_type>0</const_type>
<content>7</content>
</item>
<item class_id_reference="16" object_id="_26">
<Value>
<Obj>
<type>2</type>
<id>58</id>
<name>empty</name>
<fileName></fileName>
<fileDirectory></fileDirectory>
<lineNumber>0</lineNumber>
<contextFuncName></contextFuncName>
<inlineStackInfo>
<count>0</count>
<item_version>0</item_version>
</inlineStackInfo>
<originalName></originalName>
<rtlName></rtlName>
<coreName></coreName>
</Obj>
<bitwidth>32</bitwidth>
</Value>
<const_type>0</const_type>
<content>11</content>
</item>
<item class_id_reference="16" object_id="_27">
<Value>
<Obj>
<type>2</type>
<id>60</id>
<name>empty</name>
<fileName></fileName>
<fileDirectory></fileDirectory>
<lineNumber>0</lineNumber>
<contextFuncName></contextFuncName>
<inlineStackInfo>
<count>0</count>
<item_version>0</item_version>
</inlineStackInfo>
<originalName></originalName>
<rtlName></rtlName>
<coreName></coreName>
</Obj>
<bitwidth>32</bitwidth>
</Value>
<const_type>0</const_type>
<content>15</content>
</item>
<item class_id_reference="16" object_id="_28">
<Value>
<Obj>
<type>2</type>
<id>65</id>
<name>empty</name>
<fileName></fileName>
<fileDirectory></fileDirectory>
<lineNumber>0</lineNumber>
<contextFuncName></contextFuncName>
<inlineStackInfo>
<count>0</count>
<item_version>0</item_version>
</inlineStackInfo>
<originalName></originalName>
<rtlName></rtlName>
<coreName></coreName>
</Obj>
<bitwidth>32</bitwidth>
</Value>
<const_type>0</const_type>
<content>19</content>
</item>
<item class_id_reference="16" object_id="_29">
<Value>
<Obj>
<type>2</type>
<id>67</id>
<name>empty</name>
<fileName></fileName>
<fileDirectory></fileDirectory>
<lineNumber>0</lineNumber>
<contextFuncName></contextFuncName>
<inlineStackInfo>
<count>0</count>
<item_version>0</item_version>
</inlineStackInfo>
<originalName></originalName>
<rtlName></rtlName>
<coreName></coreName>
</Obj>
<bitwidth>32</bitwidth>
</Value>
<const_type>0</const_type>
<content>23</content>
</item>
</consts>
<blocks class_id="17" tracking_level="0" version="0">
<count>4</count>
<item_version>0</item_version>
<item class_id="18" tracking_level="1" version="0" object_id="_30">
<Obj>
<type>3</type>
<id>6</id>
<name></name>
<fileName></fileName>
<fileDirectory></fileDirectory>
<lineNumber>0</lineNumber>
<contextFuncName></contextFuncName>
<inlineStackInfo>
<count>0</count>
<item_version>0</item_version>
</inlineStackInfo>
<originalName></originalName>
<rtlName></rtlName>
<coreName></coreName>
</Obj>
<node_objs>
<count>1</count>
<item_version>0</item_version>
<item>5</item>
</node_objs>
</item>
<item class_id_reference="18" object_id="_31">
<Obj>
<type>3</type>
<id>11</id>
<name>.preheader</name>
<fileName></fileName>
<fileDirectory></fileDirectory>
<lineNumber>0</lineNumber>
<contextFuncName></contextFuncName>
<inlineStackInfo>
<count>0</count>
<item_version>0</item_version>
</inlineStackInfo>
<originalName></originalName>
<rtlName></rtlName>
<coreName></coreName>
</Obj>
<node_objs>
<count>4</count>
<item_version>0</item_version>
<item>7</item>
<item>8</item>
<item>9</item>
<item>10</item>
</node_objs>
</item>
<item class_id_reference="18" object_id="_32">
<Obj>
<type>3</type>
<id>27</id>
<name>.preheader.preheader</name>
<fileName></fileName>
<fileDirectory></fileDirectory>
<lineNumber>0</lineNumber>
<contextFuncName></contextFuncName>
<inlineStackInfo>
<count>0</count>
<item_version>0</item_version>
</inlineStackInfo>
<originalName></originalName>
<rtlName></rtlName>
<coreName></coreName>
</Obj>
<node_objs>
<count>12</count>
<item_version>0</item_version>
<item>14</item>
<item>15</item>
<item>16</item>
<item>17</item>
<item>18</item>
<item>19</item>
<item>20</item>
<item>21</item>
<item>22</item>
<item>23</item>
<item>24</item>
<item>26</item>
</node_objs>
</item>
<item class_id_reference="18" object_id="_33">
<Obj>
<type>3</type>
<id>29</id>
<name></name>
<fileName></fileName>
<fileDirectory></fileDirectory>
<lineNumber>0</lineNumber>
<contextFuncName></contextFuncName>
<inlineStackInfo>
<count>0</count>
<item_version>0</item_version>
</inlineStackInfo>
<originalName></originalName>
<rtlName></rtlName>
<coreName></coreName>
</Obj>
<node_objs>
<count>1</count>
<item_version>0</item_version>
<item>28</item>
</node_objs>
</item>
</blocks>
<edges class_id="19" tracking_level="0" version="0">
<count>37</count>
<item_version>0</item_version>
<item class_id="20" tracking_level="1" version="0" object_id="_34">
<id>30</id>
<edge_type>2</edge_type>
<source_obj>11</source_obj>
<sink_obj>5</sink_obj>
<is_back_edge>0</is_back_edge>
</item>
<item class_id_reference="20" object_id="_35">
<id>32</id>
<edge_type>1</edge_type>
<source_obj>31</source_obj>
<sink_obj>7</sink_obj>
<is_back_edge>0</is_back_edge>
</item>
<item class_id_reference="20" object_id="_36">
<id>33</id>
<edge_type>2</edge_type>
<source_obj>6</source_obj>
<sink_obj>7</sink_obj>
<is_back_edge>0</is_back_edge>
</item>
<item class_id_reference="20" object_id="_37">
<id>34</id>
<edge_type>1</edge_type>
<source_obj>9</source_obj>
<sink_obj>7</sink_obj>
<is_back_edge>1</is_back_edge>
</item>
<item class_id_reference="20" object_id="_38">
<id>35</id>
<edge_type>2</edge_type>
<source_obj>27</source_obj>
<sink_obj>7</sink_obj>
<is_back_edge>1</is_back_edge>
</item>
<item class_id_reference="20" object_id="_39">
<id>36</id>
<edge_type>1</edge_type>
<source_obj>7</source_obj>
<sink_obj>8</sink_obj>
<is_back_edge>0</is_back_edge>
</item>
<item class_id_reference="20" object_id="_40">
<id>38</id>
<edge_type>1</edge_type>
<source_obj>37</source_obj>
<sink_obj>8</sink_obj>
<is_back_edge>0</is_back_edge>
</item>
<item class_id_reference="20" object_id="_41">
<id>39</id>
<edge_type>1</edge_type>
<source_obj>7</source_obj>
<sink_obj>9</sink_obj>
<is_back_edge>0</is_back_edge>
</item>
<item class_id_reference="20" object_id="_42">
<id>41</id>
<edge_type>1</edge_type>
<source_obj>40</source_obj>
<sink_obj>9</sink_obj>
<is_back_edge>0</is_back_edge>
</item>
<item class_id_reference="20" object_id="_43">
<id>42</id>
<edge_type>1</edge_type>
<source_obj>8</source_obj>
<sink_obj>10</sink_obj>
<is_back_edge>0</is_back_edge>
</item>
<item class_id_reference="20" object_id="_44">
<id>43</id>
<edge_type>2</edge_type>
<source_obj>27</source_obj>
<sink_obj>10</sink_obj>
<is_back_edge>0</is_back_edge>
</item>
<item class_id_reference="20" object_id="_45">
<id>44</id>
<edge_type>2</edge_type>
<source_obj>29</source_obj>
<sink_obj>10</sink_obj>
<is_back_edge>0</is_back_edge>
</item>
<item class_id_reference="20" object_id="_46">
<id>47</id>
<edge_type>1</edge_type>
<source_obj>1</source_obj>
<sink_obj>14</sink_obj>
<is_back_edge>0</is_back_edge>
</item>
<item class_id_reference="20" object_id="_47">
<id>50</id>
<edge_type>1</edge_type>
<source_obj>14</source_obj>
<sink_obj>15</sink_obj>
<is_back_edge>0</is_back_edge>
</item>
<item class_id_reference="20" object_id="_48">
<id>52</id>
<edge_type>1</edge_type>
<source_obj>51</source_obj>
<sink_obj>15</sink_obj>
<is_back_edge>0</is_back_edge>
</item>
<item class_id_reference="20" object_id="_49">
<id>54</id>
<edge_type>1</edge_type>
<source_obj>53</source_obj>
<sink_obj>15</sink_obj>
<is_back_edge>0</is_back_edge>
</item>
<item class_id_reference="20" object_id="_50">
<id>55</id>
<edge_type>1</edge_type>
<source_obj>15</source_obj>
<sink_obj>16</sink_obj>
<is_back_edge>0</is_back_edge>
</item>
<item class_id_reference="20" object_id="_51">
<id>57</id>
<edge_type>1</edge_type>
<source_obj>14</source_obj>
<sink_obj>17</sink_obj>
<is_back_edge>0</is_back_edge>
</item>
<item class_id_reference="20" object_id="_52">
<id>59</id>
<edge_type>1</edge_type>
<source_obj>58</source_obj>
<sink_obj>17</sink_obj>
<is_back_edge>0</is_back_edge>
</item>
<item class_id_reference="20" object_id="_53">
<id>61</id>
<edge_type>1</edge_type>
<source_obj>60</source_obj>
<sink_obj>17</sink_obj>
<is_back_edge>0</is_back_edge>
</item>
<item class_id_reference="20" object_id="_54">
<id>62</id>
<edge_type>1</edge_type>
<source_obj>17</source_obj>
<sink_obj>18</sink_obj>
<is_back_edge>0</is_back_edge>
</item>
<item class_id_reference="20" object_id="_55">
<id>64</id>
<edge_type>1</edge_type>
<source_obj>14</source_obj>
<sink_obj>19</sink_obj>
<is_back_edge>0</is_back_edge>
</item>
<item class_id_reference="20" object_id="_56">
<id>66</id>
<edge_type>1</edge_type>
<source_obj>65</source_obj>
<sink_obj>19</sink_obj>
<is_back_edge>0</is_back_edge>
</item>
<item class_id_reference="20" object_id="_57">
<id>68</id>
<edge_type>1</edge_type>
<source_obj>67</source_obj>
<sink_obj>19</sink_obj>
<is_back_edge>0</is_back_edge>
</item>
<item class_id_reference="20" object_id="_58">
<id>69</id>
<edge_type>1</edge_type>
<source_obj>19</source_obj>
<sink_obj>20</sink_obj>
<is_back_edge>0</is_back_edge>
</item>
<item class_id_reference="20" object_id="_59">
<id>70</id>
<edge_type>1</edge_type>
<source_obj>16</source_obj>
<sink_obj>21</sink_obj>
<is_back_edge>0</is_back_edge>
</item>
<item class_id_reference="20" object_id="_60">
<id>71</id>
<edge_type>1</edge_type>
<source_obj>18</source_obj>
<sink_obj>21</sink_obj>
<is_back_edge>0</is_back_edge>
</item>
<item class_id_reference="20" object_id="_61">
<id>72</id>
<edge_type>1</edge_type>
<source_obj>21</source_obj>
<sink_obj>22</sink_obj>
<is_back_edge>0</is_back_edge>
</item>
<item class_id_reference="20" object_id="_62">
<id>73</id>
<edge_type>1</edge_type>
<source_obj>22</source_obj>
<sink_obj>23</sink_obj>
<is_back_edge>0</is_back_edge>
</item>
<item class_id_reference="20" object_id="_63">
<id>74</id>
<edge_type>1</edge_type>
<source_obj>20</source_obj>
<sink_obj>23</sink_obj>
<is_back_edge>0</is_back_edge>
</item>
<item class_id_reference="20" object_id="_64">
<id>77</id>
<edge_type>1</edge_type>
<source_obj>2</source_obj>
<sink_obj>24</sink_obj>
<is_back_edge>0</is_back_edge>
</item>
<item class_id_reference="20" object_id="_65">
<id>78</id>
<edge_type>1</edge_type>
<source_obj>23</source_obj>
<sink_obj>24</sink_obj>
<is_back_edge>0</is_back_edge>
</item>
<item class_id_reference="20" object_id="_66">
<id>79</id>
<edge_type>2</edge_type>
<source_obj>11</source_obj>
<sink_obj>26</sink_obj>
<is_back_edge>0</is_back_edge>
</item>
<item class_id_reference="20" object_id="_67">
<id>137</id>
<edge_type>2</edge_type>
<source_obj>6</source_obj>
<sink_obj>11</sink_obj>
<is_back_edge>0</is_back_edge>
</item>
<item class_id_reference="20" object_id="_68">
<id>138</id>
<edge_type>2</edge_type>
<source_obj>11</source_obj>
<sink_obj>29</sink_obj>
<is_back_edge>0</is_back_edge>
</item>
<item class_id_reference="20" object_id="_69">
<id>139</id>
<edge_type>2</edge_type>
<source_obj>11</source_obj>
<sink_obj>27</sink_obj>
<is_back_edge>0</is_back_edge>
</item>
<item class_id_reference="20" object_id="_70">
<id>140</id>
<edge_type>2</edge_type>
<source_obj>27</source_obj>
<sink_obj>11</sink_obj>
<is_back_edge>1</is_back_edge>
</item>
</edges>
</cdfg>
<cdfg_regions class_id="21" tracking_level="0" version="0">
<count>4</count>
<item_version>0</item_version>
<item class_id="22" tracking_level="1" version="0" object_id="_71">
<mId>1</mId>
<mTag>rgb2gry</mTag>
<mType>0</mType>
<sub_regions>
<count>3</count>
<item_version>0</item_version>
<item>2</item>
<item>3</item>
<item>4</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>921602</mMinLatency>
<mMaxLatency>921602</mMaxLatency>
<mIsDfPipe>0</mIsDfPipe>
<mDfPipe class_id="-1"></mDfPipe>
</item>
<item class_id_reference="22" object_id="_72">
<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>6</item>
</basic_blocks>
<mII>-1</mII>
<mDepth>-1</mDepth>
<mMinTripCount>-1</mMinTripCount>
<mMaxTripCount>-1</mMaxTripCount>
<mMinLatency>0</mMinLatency>
<mMaxLatency>0</mMaxLatency>
<mIsDfPipe>0</mIsDfPipe>
<mDfPipe class_id="-1"></mDfPipe>
</item>
<item class_id_reference="22" object_id="_73">
<mId>3</mId>
<mTag>Loop 1</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>11</item>
<item>27</item>
</basic_blocks>
<mII>1</mII>
<mDepth>2</mDepth>
<mMinTripCount>921600</mMinTripCount>
<mMaxTripCount>921600</mMaxTripCount>
<mMinLatency>921600</mMinLatency>
<mMaxLatency>921600</mMaxLatency>
<mIsDfPipe>0</mIsDfPipe>
<mDfPipe class_id="-1"></mDfPipe>
</item>
<item class_id_reference="22" object_id="_74">
<mId>4</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>29</item>
</basic_blocks>
<mII>-1</mII>
<mDepth>-1</mDepth>
<mMinTripCount>-1</mMinTripCount>
<mMaxTripCount>-1</mMaxTripCount>
<mMinLatency>0</mMinLatency>
<mMaxLatency>0</mMaxLatency>
<mIsDfPipe>0</mIsDfPipe>
<mDfPipe class_id="-1"></mDfPipe>
</item>
</cdfg_regions>
<fsm class_id="-1"></fsm>
<res class_id="-1"></res>
<node_label_latency class_id="26" tracking_level="0" version="0">
<count>18</count>
<item_version>0</item_version>
<item class_id="27" tracking_level="0" version="0">
<first>5</first>
<second class_id="28" tracking_level="0" version="0">
<first>0</first>
<second>0</second>
</second>
</item>
<item>
<first>7</first>
<second>
<first>1</first>
<second>0</second>
</second>
</item>
<item>
<first>8</first>
<second>
<first>1</first>
<second>0</second>
</second>
</item>
<item>
<first>9</first>
<second>
<first>1</first>
<second>0</second>
</second>
</item>
<item>
<first>10</first>
<second>
<first>1</first>
<second>0</second>
</second>
</item>
<item>
<first>14</first>
<second>
<first>2</first>
<second>0</second>
</second>
</item>
<item>
<first>15</first>
<second>
<first>2</first>
<second>0</second>
</second>
</item>
<item>
<first>16</first>
<second>
<first>2</first>
<second>0</second>
</second>
</item>
<item>
<first>17</first>
<second>
<first>2</first>
<second>0</second>
</second>
</item>
<item>
<first>18</first>
<second>
<first>2</first>
<second>0</second>
</second>
</item>
<item>
<first>19</first>
<second>
<first>2</first>
<second>0</second>
</second>
</item>
<item>
<first>20</first>
<second>
<first>2</first>
<second>0</second>
</second>
</item>
<item>
<first>21</first>
<second>
<first>2</first>
<second>0</second>
</second>
</item>
<item>
<first>22</first>
<second>
<first>2</first>
<second>0</second>
</second>
</item>
<item>
<first>23</first>
<second>
<first>2</first>
<second>0</second>
</second>
</item>
<item>
<first>24</first>
<second>
<first>2</first>
<second>0</second>
</second>
</item>
<item>
<first>26</first>
<second>
<first>2</first>
<second>0</second>
</second>
</item>
<item>
<first>28</first>
<second>
<first>3</first>
<second>0</second>
</second>
</item>
</node_label_latency>
<bblk_ent_exit class_id="29" tracking_level="0" version="0">
<count>4</count>
<item_version>0</item_version>
<item class_id="30" tracking_level="0" version="0">
<first>6</first>
<second class_id="31" tracking_level="0" version="0">
<first>0</first>
<second>0</second>
</second>
</item>
<item>
<first>11</first>
<second>
<first>1</first>
<second>1</second>
</second>
</item>
<item>
<first>27</first>
<second>
<first>2</first>
<second>2</second>
</second>
</item>
<item>
<first>29</first>
<second>
<first>2</first>
<second>2</second>
</second>
</item>
</bblk_ent_exit>
<regions class_id="32" tracking_level="0" version="0">
<count>1</count>
<item_version>0</item_version>
<item class_id="33" tracking_level="1" version="0" object_id="_75">
<region_name>Loop 1</region_name>
<basic_blocks>
<count>2</count>
<item_version>0</item_version>
<item>11</item>
<item>27</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>2</pipe_depth>
</item>
</regions>
<dp_fu_nodes class_id="34" tracking_level="0" version="0">
<count>0</count>
<item_version>0</item_version>
</dp_fu_nodes>
<dp_fu_nodes_expression class_id="35" tracking_level="0" version="0">
<count>0</count>
<item_version>0</item_version>
</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>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="36" tracking_level="0" version="0">
<count>0</count>
<item_version>0</item_version>
</dp_mem_port_nodes>
<dp_reg_nodes>
<count>0</count>
<item_version>0</item_version>
</dp_reg_nodes>
<dp_regname_nodes>
<count>0</count>
<item_version>0</item_version>
</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="37" tracking_level="0" version="0">
<count>0</count>
<item_version>0</item_version>
</dp_port_io_nodes>
<port2core class_id="38" 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>
| 27.296378 | 82 | 0.611755 |
4a6ebb98bf65b64c4c8135187f26136c9cdd6587 | 4,537 | ads | Ada | src/sys/serialize/util-serialize-mappers-vector_mapper.ads | yrashk/ada-util | 2aaa1d87e92a7137e1c63dce90f0722c549dfafd | [
"Apache-2.0"
] | 60 | 2015-01-18T23:05:34.000Z | 2022-03-20T18:56:30.000Z | src/sys/serialize/util-serialize-mappers-vector_mapper.ads | yrashk/ada-util | 2aaa1d87e92a7137e1c63dce90f0722c549dfafd | [
"Apache-2.0"
] | 20 | 2016-09-15T16:41:30.000Z | 2022-03-29T22:02:32.000Z | src/sys/serialize/util-serialize-mappers-vector_mapper.ads | yrashk/ada-util | 2aaa1d87e92a7137e1c63dce90f0722c549dfafd | [
"Apache-2.0"
] | 10 | 2015-02-13T04:00:45.000Z | 2022-03-20T18:57:54.000Z | -----------------------------------------------------------------------
-- Util.Serialize.Mappers.Vector_Mapper -- Mapper for vector types
-- Copyright (C) 2010, 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 Ada.Containers;
with Ada.Containers.Vectors;
with Util.Serialize.Contexts;
with Util.Serialize.Mappers.Record_Mapper;
with Util.Serialize.IO;
generic
-- Package that represents the vectors of elements.
with package Vectors is
new Ada.Containers.Vectors (<>);
-- Package that maps the element into a record.
with package Element_Mapper is
new Record_Mapper (Element_Type => Vectors.Element_Type,
others => <>);
package Util.Serialize.Mappers.Vector_Mapper is
subtype Element_Type is Vectors.Element_Type;
subtype Vector is Vectors.Vector;
subtype Index_Type is Vectors.Index_Type;
type Vector_Type_Access is access all Vector;
-- Procedure to give access to the <b>Vector</b> object from the context.
type Process_Object is not null
access procedure (Ctx : in out Util.Serialize.Contexts.Context'Class;
Process : not null access procedure (Item : in out Vector));
-- -----------------------
-- Data context
-- -----------------------
-- Data context to get access to the target element.
type Vector_Data is new Util.Serialize.Contexts.Data with private;
type Vector_Data_Access is access all Vector_Data'Class;
-- Get the vector object.
function Get_Vector (Data : in Vector_Data) return Vector_Type_Access;
-- Set the vector object.
procedure Set_Vector (Data : in out Vector_Data;
Vector : in Vector_Type_Access);
-- -----------------------
-- Record mapper
-- -----------------------
type Mapper is new Util.Serialize.Mappers.Mapper with private;
type Mapper_Access is access all Mapper'Class;
-- Execute the mapping operation on the object associated with the current context.
-- The object is extracted from the context and the <b>Execute</b> operation is called.
procedure Execute (Handler : in Mapper;
Map : in Mapping'Class;
Ctx : in out Util.Serialize.Contexts.Context'Class;
Value : in Util.Beans.Objects.Object);
-- Set the <b>Data</b> vector in the context.
procedure Set_Context (Ctx : in out Util.Serialize.Contexts.Context'Class;
Data : in Vector_Type_Access);
procedure Set_Mapping (Into : in out Mapper;
Inner : in Element_Mapper.Mapper_Access);
-- Find the mapper associated with the given name.
-- Returns null if there is no mapper.
function Find_Mapper (Controller : in Mapper;
Name : in String) return Util.Serialize.Mappers.Mapper_Access;
procedure Start_Object (Handler : in Mapper;
Context : in out Util.Serialize.Contexts.Context'Class;
Name : in String);
procedure Finish_Object (Handler : in Mapper;
Context : in out Util.Serialize.Contexts.Context'Class;
Name : in String);
-- Write the element on the stream using the mapper description.
procedure Write (Handler : in Mapper;
Stream : in out Util.Serialize.IO.Output_Stream'Class;
Element : in Vectors.Vector);
private
type Vector_Data is new Util.Serialize.Contexts.Data with record
Vector : Vector_Type_Access;
Position : Index_Type;
end record;
type Mapper is new Util.Serialize.Mappers.Mapper with record
Map : aliased Element_Mapper.Mapper;
end record;
overriding
procedure Initialize (Controller : in out Mapper);
end Util.Serialize.Mappers.Vector_Mapper; | 39.452174 | 93 | 0.633238 |
d046884377e298fbfb3485850013631072ad5c7b | 13,499 | ads | Ada | src/lib/Generic_Symbol_Table/symbol_tables-generic_symbol_table.ads | fintatarta/protypo | c0c2bca17bc766ab95acc99b7422485388a10cb4 | [
"MIT"
] | null | null | null | src/lib/Generic_Symbol_Table/symbol_tables-generic_symbol_table.ads | fintatarta/protypo | c0c2bca17bc766ab95acc99b7422485388a10cb4 | [
"MIT"
] | 4 | 2019-10-09T11:16:38.000Z | 2019-10-09T11:20:38.000Z | src/lib/Generic_Symbol_Table/symbol_tables-generic_symbol_table.ads | fintatarta/protypo | c0c2bca17bc766ab95acc99b7422485388a10cb4 | [
"MIT"
] | null | null | null | with Ada.Containers.Indefinite_Hashed_Maps;
-- with Ada.Containers.Indefinite_Holders;
with Ada.Containers.Indefinite_Vectors;
with Ada.Containers.Vectors;
with Ada.Finalization;
use Ada;
--
-- ## What is this?
--
-- This package implements a generic "symbol table," that is a structure that
-- maps symbol "names" (a string) to symbol values.
--
-- The peculiarity that differentiate the symbol tables defined in this
-- package from an ordirary `Hashed_Maps.Map` is the possibility of
-- having different namespaces, possibly nested.
--
-- ### Data model
--
-- The abstract model is as follows.
-- * The symbol table contains one or more _namespace_
-- * A newly created table has only one namespace: the _root namespace_
-- that contains all the globally visible symbols
-- * At any time there is a _current_ namespace
-- * New namespaces can be created as _children_ of an existing namespace.
-- Two common choices for the parent namespace are
-- * The current namespace (like using a `declare .. begin .. end` in Ada)
-- * The root namespace (like when a new procedure is defined)
-- * When a symbol is searched for, first it is searched the current
--- namespace. If the symbol is not found, it is searched in the parent,
-- grand-parent and so on... until the root namespace is reached.
-- * When a new namespace is created it becomes the current one;
-- when the namespace is closed, the previous current namespace is selected.
--
-- It turns out that namespaces are organized in two structures
--
-- * They are organized as a tree (having the global namspace as root)
-- according to the child-parent relationship
-- * They are organized as a stack whose top is the current namespace.
-- New namespaces are pushed to the top and they are popped when
-- they are closed.
--
-- ### Cursors
--
-- When the table is queried it returns a `Cursor` that "points to" the
-- found element (or it assumes the special value `No_Element`). This
-- is similar to the behaviour of standard Ada containers.
--
-- The main difference with the usual `Cursor` is that the cursor of
-- this structure is "stable" with respect to tampering; that is, it
-- remains valid even if new elements and/or new namespaces are added
-- (I do not think this is guaranteed with the standard containers).
-- Only removing the namespace that contains the entry pointed by the cursors
-- invalidates the cursor (obviously).
--
generic
type Symbol_Name is new String;
type Symbol_Value (<>) is private;
with function Hash (Key : Symbol_Name) return Ada.Containers.Hash_Type;
with function Equivalent_Names (X, Y : Symbol_Name) return Boolean;
package Symbol_Tables.Generic_Symbol_Table is
type Symbol_Table is
new Finalization.Limited_Controlled
with
private;
type Cursor is private;
No_Element : constant Cursor;
function Image (X : Cursor) return String;
-- Return a printable representation of a cursor. Useful
-- mostly for debugging
type Table_Namespace is private;
No_Namespace : constant Table_Namespace;
function Copy_Globals (T : Symbol_Table) return Symbol_Table;
function Root (T : Symbol_Table) return Table_Namespace;
-- Return the global namespace of the table
function Current_Namespace (T : Symbol_Table) return Table_Namespace;
-- Return the current namespace
function Parent_Of (T : Symbol_Table;
Block : Table_Namespace) return Table_Namespace
with Post => (if Block = T.Root then Parent_Of'Result = No_Namespace);
-- Return the parent of a given namespace
procedure Open_Namespace (Table : in out Symbol_Table;
Parent : Table_Namespace)
with
Pre => Parent /= No_Namespace,
Post => Parent_Of (Table, Table.Current_Namespace) = Parent;
-- Create a new namespace with the given parent
procedure Open_Internal_Namespace (Table : in out Symbol_Table);
-- Syntactic sugar: Parent defaults to Table.Current_Block
procedure Open_External_Namespace (Table : in out Symbol_Table);
-- Syntactic sugar: Parent defaults to Table.Root
procedure Close_Namespace (Table : in out Symbol_Table)
with
Pre => Table.Current_Namespace /= Table.Root;
function Find (Table : Symbol_Table;
Name : Symbol_Name)
return Cursor;
function Contains (Table : Symbol_Table;
Name : Symbol_Name)
return Boolean
is (Table.Find (Name) /= No_Element);
function Has_Value (Pos : Cursor) return Boolean
with Pre => Pos /= No_Element;
function Value (Pos : Cursor) return Symbol_Value
with Pre => Has_Value (Pos);
function Name (Pos : Cursor) return Symbol_Name
with Pre => Pos /= No_Element;
function Contains (Block : Table_Namespace;
Name : Symbol_Name)
return Boolean;
procedure Create (Table : in out Symbol_Table;
Name : Symbol_Name;
Initial_Value : Symbol_Value)
with
Pre =>
not Contains (Table.Current_Namespace, Name),
Post =>
Contains (Table.Current_Namespace, Name)
and
Table.Current_Namespace = Table.Current_Namespace'Old;
procedure Create (Table : in out Symbol_Table;
Name : Symbol_Name;
Initial_Value : Symbol_Value;
Position : out Cursor)
with
Pre =>
not Contains (Table.Current_Namespace, Name),
Post =>
Contains (Table.Current_Namespace, Name)
and
Table.Current_Namespace = Table.Current_Namespace'Old
and
Table.Find (Name) = Position
and
Has_Value (Position)
and
Value (Position) = Initial_Value;
-- procedure Create (Table : in out Symbol_Table;
-- Name : Symbol_Name;
-- Position : out Cursor)
-- with
-- Pre =>
-- not Contains (Table.Current_Block, Name),
-- Post =>
-- Contains (Table.Current_Block, Name)
-- and
-- Table.Current_Block = Table.Current_Block'Old
-- and
-- Table.Find (Name) = Position
-- and
-- not Has_Value (Position);
procedure Update (Pos : Cursor;
New_Value : Symbol_Value)
with
Pre => Pos /= No_Element;
Uninitialized_Value : exception;
type Value_Printer is access function (X : Symbol_Value) return String;
procedure Set_Printer (Callback : Value_Printer);
-- Useful for debugging. Setup a function that converts symbol values
-- to string. This function will be used in generating debug prints.
-- Why specifying the converter in this way and not as a parameter
-- to package? Because it is a feature that it is not always
-- required.
Stale_Cursor : exception;
private
--
-- The structure of the symbol table is as follows: we have a stacks
-- of Namespaces. When a new namespace is open, it is pushed on the
-- stack, when it is closed it is popped out. The top of the stack
-- is always the current block. The stack can never be empty, the
-- bottom of the stack is the global namespace.
--
-- Blocks can have a "parent" that is searched when the symbol is not
-- found. The parent list goes from the block to the root.
--
-- Every namespace has an ID that is monotonically increased. Two
-- namespaces will never have the same ID.
--
-- Every namespace has two structure: a vector of Symbol_Value and
-- a Map mapping symbol_names to vector indexes. Why this involuted
-- structure? Why not just a map sending names to values? Because
-- in this way we can have a stable Cursor given by
-- * The namespace index in the stack
-- * The namespace ID
-- * The index of the entry in the value vector
--
-- This Cursor is stable against new additions to the table, a feature
-- that is sometimes required and that maybe is not guaranteed with
-- the usual library structures. The ID is not stricly necessary,
-- but it is useful to check for stale Cursors that refer to past
-- namespaces.
--
type Value_Index is range 1 .. Positive'Last;
type Namespace_Index is range 1 .. Positive'Last;
type Namespace_ID is range 0 .. Positive'Last;
Root_ID : constant Namespace_ID := Namespace_ID'First;
Root_Namespace : constant Namespace_Index := Namespace_Index'First;
package Name_Maps is
new Ada.Containers.Indefinite_Hashed_Maps
(Key_Type => Symbol_Name,
Element_Type => Value_Index,
Hash => Hash,
Equivalent_Keys => Equivalent_Names);
package Value_Vectors is
new Ada.Containers.Indefinite_Vectors (Index_Type => Value_Index,
Element_Type => Symbol_Value);
package Name_Vectors is
new Ada.Containers.Indefinite_Vectors (Index_Type => Value_Index,
Element_Type => Symbol_Name);
type Basic_Table;
type Basic_Table_Access is access Basic_Table;
type Table_Namespace is
record
Table : Basic_Table_Access;
Index : Namespace_Index;
ID : Namespace_ID;
end record;
No_Namespace : constant Table_Namespace := (Table => null,
Index => Namespace_Index'Last,
ID => Namespace_ID'Last);
type Namespace_Block is
record
Name_Map : Name_Maps.Map;
Values : Value_Vectors.Vector;
Names : Name_Vectors.Vector;
ID : Namespace_ID;
Parent : Table_Namespace;
end record;
-- with Dynamic_Predicate =>
-- (for all Idx in Namespace_Block.Names.First_Index .. Namespace_Block.Names.Last_Index
-- => Namespace_Block.Name_Map (Namespace_Block.Names (Idx)) = Idx)
-- and Names.First_Index = Values.First_Index
-- and Names.Last_Index = Values.Last_Index;
type Cursor is
record
Namespace : Table_Namespace;
Idx : Value_Index;
end record;
No_Element : constant Cursor := Cursor'(Namespace => No_Namespace,
Idx => Value_Index'Last);
function Image (X : Cursor) return String
is (if Has_Value (X) then
"["
& X.Idx'Image
& "@"
& X.Namespace.Index'Image
& ","
& X.Namespace.ID'Image
& "]"
else
"NO_ELEMENT");
package Namespace_Stacks is
new Ada.Containers.Vectors (Index_Type => Namespace_Index,
Element_Type => Namespace_Block);
-- package Value_Holders is
-- new Ada.Containers.Indefinite_Holders (Symbol_Value);
--
-- use type Value_Holders.Holder;
--
-- subtype Map_Entry is Value_Holders.Holder;
subtype Namespace_Stack is Namespace_Stacks.Vector;
procedure Push (Stack : in out Namespace_Stack;
Item : Namespace_Block);
procedure Pop (Stack : in out Namespace_Stack);
type Basic_Table is
record
Stack : Namespace_Stacks.Vector;
end record;
type Symbol_Table is
new Finalization.Limited_Controlled
with
record
Counter : Namespace_ID := Root_ID;
T : Basic_Table_Access;
end record;
overriding procedure Initialize (Object : in out Symbol_Table);
function Root (T : Symbol_Table) return Table_Namespace
is (Table_Namespace'(Table => T.T,
Index => Root_Namespace,
ID => Root_ID));
function Current_Namespace (T : Symbol_Table) return Table_Namespace
is (Table_Namespace'(Table => T.T,
Index => T.T.Stack.Last_Index,
Id => T.T.Stack.Last_Element.ID));
function Parent_Of (Block : Table_Namespace) return Table_Namespace
is (Block.Table.Stack.Element (Block.Index).Parent);
function Contains (Block : Table_Namespace;
Name : Symbol_Name)
return Boolean
is (Block.Table.Stack (Block.Index).Name_Map.Contains (Name));
function Is_Stale (Pos : Cursor) return Boolean
is (Pos.Namespace /= No_Namespace and then
(Pos.Namespace.Table.Stack (Pos.Namespace.Index).Id /= Pos.Namespace.Id));
function Value (Pos : Cursor) return Symbol_Value
is (if not Is_Stale (Pos) then
(if Has_Value (Pos) then
Pos.Namespace.Table.Stack (Pos.Namespace.Index).Values (Pos.Idx)
else
raise Uninitialized_Value with String (Name (Pos)))
else
raise Stale_Cursor);
function Has_Value (Pos : Cursor) return Boolean
is (Pos.Namespace /= No_Namespace);
function Name (Pos : Cursor) return Symbol_Name
is (Pos.Namespace.Table.Stack (Pos.Namespace.Index).Names (Pos.Idx));
function Parent_Of (T : Symbol_Table;
Block : Table_Namespace) return Table_Namespace
is (Table_Namespace'(Table => Block.Table,
Index => Block.Table.Stack (Block.Index).Parent.Index,
ID => Block.Table.Stack (Block.Index).Parent.ID));
end Symbol_Tables.Generic_Symbol_Table;
| 35.71164 | 99 | 0.640936 |
dc094557229ca0ff33d47fa80a68e2e0053dbe1d | 2,598 | adb | Ada | bb-runtimes/runtimes/ravenscar-full-stm32f3x4/gnat/g-casuti.adb | JCGobbi/Nucleo-STM32F334R8 | 2a0b1b4b2664c92773703ac5e95dcb71979d051c | [
"BSD-3-Clause"
] | null | null | null | bb-runtimes/runtimes/ravenscar-full-stm32f3x4/gnat/g-casuti.adb | JCGobbi/Nucleo-STM32F334R8 | 2a0b1b4b2664c92773703ac5e95dcb71979d051c | [
"BSD-3-Clause"
] | null | null | null | bb-runtimes/runtimes/ravenscar-full-stm32f3x4/gnat/g-casuti.adb | JCGobbi/Nucleo-STM32F334R8 | 2a0b1b4b2664c92773703ac5e95dcb71979d051c | [
"BSD-3-Clause"
] | null | null | null | ------------------------------------------------------------------------------
-- --
-- GNAT RUN-TIME COMPONENTS --
-- --
-- G N A T . C A S E _ U T I L --
-- --
-- B o d y --
-- --
-- Copyright (C) 1995-2021, 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. --
-- --
-- --
-- --
-- --
-- --
-- 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 does not require a body, since it is a package renaming. We
-- provide a dummy file containing a No_Body pragma so that previous versions
-- of the body (which did exist) will not interfere.
pragma No_Body;
| 70.216216 | 78 | 0.32756 |
2060eeeae8010a47f6b638cd6e8774ac27043862 | 2,408 | adb | Ada | tools/generator/meta-classes.adb | reznikmm/gela | 20134f1d154fb763812e73860c6f4b04f353df79 | [
"MIT"
] | null | null | null | tools/generator/meta-classes.adb | reznikmm/gela | 20134f1d154fb763812e73860c6f4b04f353df79 | [
"MIT"
] | null | null | null | tools/generator/meta-classes.adb | 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
-------------------------------------------------------------
package body Meta.Classes is
----------------
-- Add_Parent --
----------------
not overriding procedure Add_Parent
(Self : in out Class;
Name : League.Strings.Universal_String) is
begin
Self.Parents.Append (Name);
end Add_Parent;
------------------
-- Add_Property --
------------------
not overriding procedure Add_Property
(Self : in out Class;
Value : Property) is
begin
Self.Last_Prop := Self.Last_Prop + 1;
Self.Properties (Self.Last_Prop) := Value;
end Add_Property;
--------------------
-- Generic_Filter --
--------------------
function Generic_Filter (List : Property_Array) return Property_Array is
Result : Property_Array (List'Range);
Last : Natural := Result'First - 1;
begin
for J in List'Range loop
if Pass (List (J)) then
Last := Last + 1;
Result (Last) := List (J);
end if;
end loop;
return Result (Result'First .. Last);
end Generic_Filter;
----------------
-- Initialize --
----------------
not overriding procedure Initialize
(Self : in out Class;
Name : League.Strings.Universal_String;
Is_Abstract : Boolean := False) is
begin
Self.Name := Name;
Self.Is_Abstract := Is_Abstract;
Self.Parents.Clear;
Self.Last_Prop := 0;
end Initialize;
-----------------
-- Is_Abstract --
-----------------
not overriding function Is_Abstract (Self : Class) return Boolean is
begin
return Self.Is_Abstract;
end Is_Abstract;
----------
-- Name --
----------
not overriding function Name
(Self : Class) return League.Strings.Universal_String is
begin
return Self.Name;
end Name;
-------------
-- Parents --
-------------
not overriding function Parents
(Self : Class) return League.String_Vectors.Universal_String_Vector is
begin
return Self.Parents;
end Parents;
----------------
-- Properties --
----------------
not overriding function Properties (Self : Class) return Property_Array is
begin
return Self.Properties (1 .. Self.Last_Prop);
end Properties;
end Meta.Classes;
| 23.378641 | 77 | 0.540698 |
cba8f8a0fb3a9dbb7e9d1d315c0254e8eebda62c | 8,065 | ads | Ada | source/amf/mof/xmi/amf-internals-xmi_handlers.ads | svn2github/matreshka | 9d222b3ad9da508855fb1f5adbe5e8a4fad4c530 | [
"BSD-3-Clause"
] | 24 | 2016-11-29T06:59:41.000Z | 2021-08-30T11:55:16.000Z | source/amf/mof/xmi/amf-internals-xmi_handlers.ads | svn2github/matreshka | 9d222b3ad9da508855fb1f5adbe5e8a4fad4c530 | [
"BSD-3-Clause"
] | 2 | 2019-01-16T05:15:20.000Z | 2019-02-03T10:03:32.000Z | source/amf/mof/xmi/amf-internals-xmi_handlers.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 © 2010-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$
------------------------------------------------------------------------------
private with Ada.Containers.Vectors;
private with Ada.Containers.Hashed_Maps;
private with League.Strings.Hash;
private with XML.SAX.Attributes;
with XML.SAX.Content_Handlers;
with XML.SAX.Error_Handlers;
private with XML.SAX.Locators;
private with XML.SAX.Parse_Exceptions;
private with AMF.CMOF.Packages;
private with AMF.CMOF.Properties;
private with AMF.Elements;
with AMF.Internals.XMI_Readers;
with AMF.URI_Stores;
package AMF.Internals.XMI_Handlers is
type XMI_Handler
(Context : not null access AMF.Internals.XMI_Readers.XMI_Reader'Class) is
limited new XML.SAX.Content_Handlers.SAX_Content_Handler
and XML.SAX.Error_Handlers.SAX_Error_Handler with private;
function Extent (Self : XMI_Handler) return AMF.URI_Stores.URI_Store_Access;
function Extent
(URI : League.Strings.Universal_String)
return AMF.URI_Stores.URI_Store_Access;
-- Returns extent with specified URI.
--
-- XXX Should be removed
private
package Element_Vectors is
new Ada.Containers.Vectors
(Positive, AMF.Elements.Element_Access, AMF.Elements."=");
type Postponed_Link is record
Element : AMF.Elements.Element_Access;
Attribute : AMF.CMOF.Properties.CMOF_Property_Access;
Id : League.Strings.Universal_String;
end record;
package Postponed_Link_Vectors is
new Ada.Containers.Vectors (Positive, Postponed_Link);
package String_Element_Maps is
new Ada.Containers.Hashed_Maps
(League.Strings.Universal_String,
AMF.Elements.Element_Access,
League.Strings.Hash,
League.Strings."=",
AMF.Elements."=");
package String_Package_Maps is
new Ada.Containers.Hashed_Maps
(League.Strings.Universal_String,
AMF.CMOF.Packages.CMOF_Package_Access,
League.Strings.Hash,
League.Strings."=",
AMF.CMOF.Packages."=");
type XMI_Handler
(Context : not null access AMF.Internals.XMI_Readers.XMI_Reader'Class) is
limited new XML.SAX.Content_Handlers.SAX_Content_Handler
and XML.SAX.Error_Handlers.SAX_Error_Handler with
record
Extent : AMF.URI_Stores.URI_Store_Access;
Current : AMF.Elements.Element_Access;
Stack : Element_Vectors.Vector;
Attribute : AMF.CMOF.Properties.CMOF_Property_Access;
Text : League.Strings.Universal_String;
Collect_Text : Boolean := False;
Mapping : String_Element_Maps.Map;
Postponed : Postponed_Link_Vectors.Vector;
Skip_Element : Natural := 0;
XMI_Namespace : League.Strings.Universal_String;
-- Actual namespace of the XMI document.
URI_Package_Map : String_Package_Maps.Map;
Prefix_Package_Map : String_Package_Maps.Map;
-- Mapping from namespace URI and namespace prefix to the package of the
-- corresponding metamodel.
Diagnosis : League.Strings.Universal_String;
Locator : XML.SAX.Locators.SAX_Locator;
end record;
overriding procedure Characters
(Self : in out XMI_Handler;
Text : League.Strings.Universal_String;
Success : in out Boolean);
overriding procedure End_Document
(Self : in out XMI_Handler;
Success : in out Boolean);
overriding procedure End_Element
(Self : in out XMI_Handler;
Namespace_URI : League.Strings.Universal_String;
Local_Name : League.Strings.Universal_String;
Qualified_Name : League.Strings.Universal_String;
Success : in out Boolean);
overriding function Error_String
(Self : XMI_Handler) return League.Strings.Universal_String;
overriding procedure Fatal_Error
(Self : in out XMI_Handler;
Occurrence : XML.SAX.Parse_Exceptions.SAX_Parse_Exception);
overriding procedure Set_Document_Locator
(Self : in out XMI_Handler;
Locator : XML.SAX.Locators.SAX_Locator);
overriding procedure Start_Document
(Self : in out XMI_Handler;
Success : in out Boolean);
overriding procedure Start_Element
(Self : in out XMI_Handler;
Namespace_URI : League.Strings.Universal_String;
Local_Name : League.Strings.Universal_String;
Qualified_Name : League.Strings.Universal_String;
Attributes : XML.SAX.Attributes.SAX_Attributes;
Success : in out Boolean);
overriding procedure Start_Prefix_Mapping
(Self : in out XMI_Handler;
Prefix : League.Strings.Universal_String;
Namespace_URI : League.Strings.Universal_String;
Success : in out Boolean);
end AMF.Internals.XMI_Handlers;
| 45.564972 | 79 | 0.567018 |
18e2c7d36cca7656a9db7bd607d64b0a03b84bbb | 3,608 | ads | Ada | source/amf/uml/amf-uml-message_ends-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-uml-message_ends-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-uml-message_ends-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.UML.Message_Ends.Hash is
new AMF.Elements.Generic_Hash (UML_Message_End, UML_Message_End_Access);
| 72.16 | 78 | 0.401885 |
18abb00552d8e3314dfa8f9c0605bcd21da3d04c | 3,591 | ads | Ada | source/amf/uml/amf-uml-classes-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-uml-classes-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-uml-classes-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.UML.Classes.Hash is
new AMF.Elements.Generic_Hash (UML_Class, UML_Class_Access);
| 71.82 | 78 | 0.399053 |
0e11e6506edc766c21986a2400e427c54292f70a | 46,748 | adb | Ada | llvm-gcc-4.2-2.9/gcc/ada/a-ciorse.adb | 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-ciorse.adb | vidkidz/crossbridge | ba0bf94aee0ce6cf7eb5be882382e52bc57ba396 | [
"MIT"
] | null | null | null | llvm-gcc-4.2-2.9/gcc/ada/a-ciorse.adb | vidkidz/crossbridge | ba0bf94aee0ce6cf7eb5be882382e52bc57ba396 | [
"MIT"
] | null | null | null | ------------------------------------------------------------------------------
-- --
-- GNAT LIBRARY COMPONENTS --
-- --
-- A D A . C O N T A I N E R S . --
-- I N D E F I N I T E _ O R D E R E D _ S E T S --
-- --
-- B o d y --
-- --
-- Copyright (C) 2004-2005, 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 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. --
-- --
-- This unit was originally developed by Matthew J Heaney. --
------------------------------------------------------------------------------
with Ada.Containers.Red_Black_Trees.Generic_Operations;
pragma Elaborate_All (Ada.Containers.Red_Black_Trees.Generic_Operations);
with Ada.Containers.Red_Black_Trees.Generic_Keys;
pragma Elaborate_All (Ada.Containers.Red_Black_Trees.Generic_Keys);
with Ada.Containers.Red_Black_Trees.Generic_Set_Operations;
pragma Elaborate_All (Ada.Containers.Red_Black_Trees.Generic_Set_Operations);
with Ada.Unchecked_Deallocation;
package body Ada.Containers.Indefinite_Ordered_Sets is
-----------------------
-- Local Subprograms --
-----------------------
function Color (Node : Node_Access) return Color_Type;
pragma Inline (Color);
function Copy_Node (Source : Node_Access) return Node_Access;
pragma Inline (Copy_Node);
procedure Free (X : in out Node_Access);
procedure Insert_Sans_Hint
(Tree : in out Tree_Type;
New_Item : Element_Type;
Node : out Node_Access;
Inserted : out Boolean);
procedure Insert_With_Hint
(Dst_Tree : in out Tree_Type;
Dst_Hint : Node_Access;
Src_Node : Node_Access;
Dst_Node : out Node_Access);
function Is_Greater_Element_Node
(Left : Element_Type;
Right : Node_Access) return Boolean;
pragma Inline (Is_Greater_Element_Node);
function Is_Less_Element_Node
(Left : Element_Type;
Right : Node_Access) return Boolean;
pragma Inline (Is_Less_Element_Node);
function Is_Less_Node_Node (L, R : Node_Access) return Boolean;
pragma Inline (Is_Less_Node_Node);
function Left (Node : Node_Access) return Node_Access;
pragma Inline (Left);
function Parent (Node : Node_Access) return Node_Access;
pragma Inline (Parent);
procedure Replace_Element
(Tree : in out Tree_Type;
Node : Node_Access;
Item : Element_Type);
function Right (Node : Node_Access) return Node_Access;
pragma Inline (Right);
procedure Set_Color (Node : Node_Access; Color : Color_Type);
pragma Inline (Set_Color);
procedure Set_Left (Node : Node_Access; Left : Node_Access);
pragma Inline (Set_Left);
procedure Set_Parent (Node : Node_Access; Parent : Node_Access);
pragma Inline (Set_Parent);
procedure Set_Right (Node : Node_Access; Right : Node_Access);
pragma Inline (Set_Right);
--------------------------
-- Local Instantiations --
--------------------------
procedure Free_Element is
new Ada.Unchecked_Deallocation (Element_Type, Element_Access);
package Tree_Operations is
new Red_Black_Trees.Generic_Operations (Tree_Types);
procedure Delete_Tree is
new Tree_Operations.Generic_Delete_Tree (Free);
function Copy_Tree is
new Tree_Operations.Generic_Copy_Tree (Copy_Node, Delete_Tree);
use Tree_Operations;
package Element_Keys is
new Red_Black_Trees.Generic_Keys
(Tree_Operations => Tree_Operations,
Key_Type => Element_Type,
Is_Less_Key_Node => Is_Less_Element_Node,
Is_Greater_Key_Node => Is_Greater_Element_Node);
package Set_Ops is
new Generic_Set_Operations
(Tree_Operations => Tree_Operations,
Insert_With_Hint => Insert_With_Hint,
Copy_Tree => Copy_Tree,
Delete_Tree => Delete_Tree,
Is_Less => Is_Less_Node_Node,
Free => Free);
---------
-- "<" --
---------
function "<" (Left, Right : Cursor) return Boolean is
begin
if Left.Node = null then
raise Constraint_Error with "Left cursor equals No_Element";
end if;
if Right.Node = null then
raise Constraint_Error with "Right cursor equals No_Element";
end if;
if Left.Node.Element = null then
raise Program_Error with "Left cursor is bad";
end if;
if Right.Node.Element = null then
raise Program_Error with "Right cursor is bad";
end if;
pragma Assert (Vet (Left.Container.Tree, Left.Node),
"bad Left cursor in ""<""");
pragma Assert (Vet (Right.Container.Tree, Right.Node),
"bad Right cursor in ""<""");
return Left.Node.Element.all < Right.Node.Element.all;
end "<";
function "<" (Left : Cursor; Right : Element_Type) return Boolean is
begin
if Left.Node = null then
raise Constraint_Error with "Left cursor equals No_Element";
end if;
if Left.Node.Element = null then
raise Program_Error with "Left cursor is bad";
end if;
pragma Assert (Vet (Left.Container.Tree, Left.Node),
"bad Left cursor in ""<""");
return Left.Node.Element.all < Right;
end "<";
function "<" (Left : Element_Type; Right : Cursor) return Boolean is
begin
if Right.Node = null then
raise Constraint_Error with "Right cursor equals No_Element";
end if;
if Right.Node.Element = null then
raise Program_Error with "Right cursor is bad";
end if;
pragma Assert (Vet (Right.Container.Tree, Right.Node),
"bad Right cursor in ""<""");
return Left < Right.Node.Element.all;
end "<";
---------
-- "=" --
---------
function "=" (Left, Right : Set) return Boolean is
function Is_Equal_Node_Node (L, R : Node_Access) return Boolean;
pragma Inline (Is_Equal_Node_Node);
function Is_Equal is
new Tree_Operations.Generic_Equal (Is_Equal_Node_Node);
------------------------
-- Is_Equal_Node_Node --
------------------------
function Is_Equal_Node_Node (L, R : Node_Access) return Boolean is
begin
return L.Element.all = R.Element.all;
end Is_Equal_Node_Node;
-- Start of processing for "="
begin
return Is_Equal (Left.Tree, Right.Tree);
end "=";
---------
-- ">" --
---------
function ">" (Left, Right : Cursor) return Boolean is
begin
if Left.Node = null then
raise Constraint_Error with "Left cursor equals No_Element";
end if;
if Right.Node = null then
raise Constraint_Error with "Right cursor equals No_Element";
end if;
if Left.Node.Element = null then
raise Program_Error with "Left cursor is bad";
end if;
if Right.Node.Element = null then
raise Program_Error with "Right cursor is bad";
end if;
pragma Assert (Vet (Left.Container.Tree, Left.Node),
"bad Left cursor in "">""");
pragma Assert (Vet (Right.Container.Tree, Right.Node),
"bad Right cursor in "">""");
-- L > R same as R < L
return Right.Node.Element.all < Left.Node.Element.all;
end ">";
function ">" (Left : Cursor; Right : Element_Type) return Boolean is
begin
if Left.Node = null then
raise Constraint_Error with "Left cursor equals No_Element";
end if;
if Left.Node.Element = null then
raise Program_Error with "Left cursor is bad";
end if;
pragma Assert (Vet (Left.Container.Tree, Left.Node),
"bad Left cursor in "">""");
return Right < Left.Node.Element.all;
end ">";
function ">" (Left : Element_Type; Right : Cursor) return Boolean is
begin
if Right.Node = null then
raise Constraint_Error with "Right cursor equals No_Element";
end if;
if Right.Node.Element = null then
raise Program_Error with "Right cursor is bad";
end if;
pragma Assert (Vet (Right.Container.Tree, Right.Node),
"bad Right cursor in "">""");
return Right.Node.Element.all < Left;
end ">";
------------
-- Adjust --
------------
procedure Adjust is
new Tree_Operations.Generic_Adjust (Copy_Tree);
procedure Adjust (Container : in out Set) is
begin
Adjust (Container.Tree);
end Adjust;
-------------
-- Ceiling --
-------------
function Ceiling (Container : Set; Item : Element_Type) return Cursor is
Node : constant Node_Access :=
Element_Keys.Ceiling (Container.Tree, Item);
begin
if Node = null then
return No_Element;
end if;
return Cursor'(Container'Unrestricted_Access, Node);
end Ceiling;
-----------
-- Clear --
-----------
procedure Clear is
new Tree_Operations.Generic_Clear (Delete_Tree);
procedure Clear (Container : in out Set) is
begin
Clear (Container.Tree);
end Clear;
-----------
-- Color --
-----------
function Color (Node : Node_Access) return Color_Type is
begin
return Node.Color;
end Color;
--------------
-- Contains --
--------------
function Contains (Container : Set; Item : Element_Type) return Boolean is
begin
return Find (Container, Item) /= No_Element;
end Contains;
---------------
-- Copy_Node --
---------------
function Copy_Node (Source : Node_Access) return Node_Access is
Element : Element_Access := new Element_Type'(Source.Element.all);
begin
return new Node_Type'(Parent => null,
Left => null,
Right => null,
Color => Source.Color,
Element => Element);
exception
when others =>
Free_Element (Element);
raise;
end Copy_Node;
------------
-- Delete --
------------
procedure Delete (Container : in out Set; Position : in out Cursor) is
begin
if Position.Node = null then
raise Constraint_Error with "Position cursor equals No_Element";
end if;
if Position.Node.Element = null then
raise Program_Error with "Position cursor is bad";
end if;
if Position.Container /= Container'Unrestricted_Access then
raise Program_Error with "Position cursor designates wrong set";
end if;
pragma Assert (Vet (Container.Tree, Position.Node),
"bad cursor in Delete");
Tree_Operations.Delete_Node_Sans_Free (Container.Tree, Position.Node);
Free (Position.Node);
Position.Container := null;
end Delete;
procedure Delete (Container : in out Set; Item : Element_Type) is
X : Node_Access :=
Element_Keys.Find (Container.Tree, Item);
begin
if X = null then
raise Constraint_Error with "attempt to delete element not in set";
end if;
Tree_Operations.Delete_Node_Sans_Free (Container.Tree, X);
Free (X);
end Delete;
------------------
-- Delete_First --
------------------
procedure Delete_First (Container : in out Set) is
Tree : Tree_Type renames Container.Tree;
X : Node_Access := Tree.First;
begin
if X /= null then
Tree_Operations.Delete_Node_Sans_Free (Tree, X);
Free (X);
end if;
end Delete_First;
-----------------
-- Delete_Last --
-----------------
procedure Delete_Last (Container : in out Set) is
Tree : Tree_Type renames Container.Tree;
X : Node_Access := Tree.Last;
begin
if X /= null then
Tree_Operations.Delete_Node_Sans_Free (Tree, X);
Free (X);
end if;
end Delete_Last;
----------------
-- Difference --
----------------
procedure Difference (Target : in out Set; Source : Set) is
begin
Set_Ops.Difference (Target.Tree, Source.Tree);
end Difference;
function Difference (Left, Right : Set) return Set is
Tree : constant Tree_Type :=
Set_Ops.Difference (Left.Tree, Right.Tree);
begin
return Set'(Controlled with Tree);
end Difference;
-------------
-- Element --
-------------
function Element (Position : Cursor) return Element_Type is
begin
if Position.Node = null then
raise Constraint_Error with "Position cursor equals No_Element";
end if;
if Position.Node.Element = null then
raise Program_Error with "Position cursor is bad";
end if;
pragma Assert (Vet (Position.Container.Tree, Position.Node),
"bad cursor in Element");
return Position.Node.Element.all;
end Element;
-------------------------
-- Equivalent_Elements --
-------------------------
function Equivalent_Elements (Left, Right : Element_Type) return Boolean is
begin
if Left < Right
or else Right < Left
then
return False;
else
return True;
end if;
end Equivalent_Elements;
---------------------
-- Equivalent_Sets --
---------------------
function Equivalent_Sets (Left, Right : Set) return Boolean is
function Is_Equivalent_Node_Node (L, R : Node_Access) return Boolean;
pragma Inline (Is_Equivalent_Node_Node);
function Is_Equivalent is
new Tree_Operations.Generic_Equal (Is_Equivalent_Node_Node);
-----------------------------
-- Is_Equivalent_Node_Node --
-----------------------------
function Is_Equivalent_Node_Node (L, R : Node_Access) return Boolean is
begin
if L.Element.all < R.Element.all then
return False;
elsif R.Element.all < L.Element.all then
return False;
else
return True;
end if;
end Is_Equivalent_Node_Node;
-- Start of processing for Equivalent_Sets
begin
return Is_Equivalent (Left.Tree, Right.Tree);
end Equivalent_Sets;
-------------
-- Exclude --
-------------
procedure Exclude (Container : in out Set; Item : Element_Type) is
X : Node_Access :=
Element_Keys.Find (Container.Tree, Item);
begin
if X /= null then
Tree_Operations.Delete_Node_Sans_Free (Container.Tree, X);
Free (X);
end if;
end Exclude;
----------
-- Find --
----------
function Find (Container : Set; Item : Element_Type) return Cursor is
Node : constant Node_Access :=
Element_Keys.Find (Container.Tree, Item);
begin
if Node = null then
return No_Element;
end if;
return Cursor'(Container'Unrestricted_Access, Node);
end Find;
-----------
-- First --
-----------
function First (Container : Set) return Cursor is
begin
if Container.Tree.First = null then
return No_Element;
end if;
return Cursor'(Container'Unrestricted_Access, Container.Tree.First);
end First;
-------------------
-- First_Element --
-------------------
function First_Element (Container : Set) return Element_Type is
begin
if Container.Tree.First = null then
raise Constraint_Error with "set is empty";
end if;
return Container.Tree.First.Element.all;
end First_Element;
-----------
-- Floor --
-----------
function Floor (Container : Set; Item : Element_Type) return Cursor is
Node : constant Node_Access :=
Element_Keys.Floor (Container.Tree, Item);
begin
if Node = null then
return No_Element;
end if;
return Cursor'(Container'Unrestricted_Access, Node);
end Floor;
----------
-- Free --
----------
procedure Free (X : in out Node_Access) is
procedure Deallocate is
new Ada.Unchecked_Deallocation (Node_Type, Node_Access);
begin
if X = null then
return;
end if;
X.Parent := X;
X.Left := X;
X.Right := X;
begin
Free_Element (X.Element);
exception
when others =>
X.Element := null;
Deallocate (X);
raise;
end;
Deallocate (X);
end Free;
------------------
-- Generic_Keys --
------------------
package body Generic_Keys is
-----------------------
-- Local Subprograms --
-----------------------
function Is_Greater_Key_Node
(Left : Key_Type;
Right : Node_Access) return Boolean;
pragma Inline (Is_Greater_Key_Node);
function Is_Less_Key_Node
(Left : Key_Type;
Right : Node_Access) return Boolean;
pragma Inline (Is_Less_Key_Node);
--------------------------
-- Local Instantiations --
--------------------------
package Key_Keys is
new Red_Black_Trees.Generic_Keys
(Tree_Operations => Tree_Operations,
Key_Type => Key_Type,
Is_Less_Key_Node => Is_Less_Key_Node,
Is_Greater_Key_Node => Is_Greater_Key_Node);
-------------
-- Ceiling --
-------------
function Ceiling (Container : Set; Key : Key_Type) return Cursor is
Node : constant Node_Access :=
Key_Keys.Ceiling (Container.Tree, Key);
begin
if Node = null then
return No_Element;
end if;
return Cursor'(Container'Unrestricted_Access, Node);
end Ceiling;
--------------
-- Contains --
--------------
function Contains (Container : Set; Key : Key_Type) return Boolean is
begin
return Find (Container, Key) /= No_Element;
end Contains;
------------
-- Delete --
------------
procedure Delete (Container : in out Set; Key : Key_Type) is
X : Node_Access := Key_Keys.Find (Container.Tree, Key);
begin
if X = null then
raise Constraint_Error with "attempt to delete key not in set";
end if;
Tree_Operations.Delete_Node_Sans_Free (Container.Tree, X);
Free (X);
end Delete;
-------------
-- Element --
-------------
function Element (Container : Set; Key : Key_Type) return Element_Type is
Node : constant Node_Access :=
Key_Keys.Find (Container.Tree, Key);
begin
if Node = null then
raise Constraint_Error with "key not in set";
end if;
return Node.Element.all;
end Element;
---------------------
-- Equivalent_Keys --
---------------------
function Equivalent_Keys (Left, Right : Key_Type) return Boolean is
begin
if Left < Right
or else Right < Left
then
return False;
else
return True;
end if;
end Equivalent_Keys;
-------------
-- Exclude --
-------------
procedure Exclude (Container : in out Set; Key : Key_Type) is
X : Node_Access := Key_Keys.Find (Container.Tree, Key);
begin
if X /= null then
Tree_Operations.Delete_Node_Sans_Free (Container.Tree, X);
Free (X);
end if;
end Exclude;
----------
-- Find --
----------
function Find (Container : Set; Key : Key_Type) return Cursor is
Node : constant Node_Access :=
Key_Keys.Find (Container.Tree, Key);
begin
if Node = null then
return No_Element;
end if;
return Cursor'(Container'Unrestricted_Access, Node);
end Find;
-----------
-- Floor --
-----------
function Floor (Container : Set; Key : Key_Type) return Cursor is
Node : constant Node_Access :=
Key_Keys.Floor (Container.Tree, Key);
begin
if Node = null then
return No_Element;
end if;
return Cursor'(Container'Unrestricted_Access, Node);
end Floor;
-------------------------
-- Is_Greater_Key_Node --
-------------------------
function Is_Greater_Key_Node
(Left : Key_Type;
Right : Node_Access) return Boolean is
begin
return Key (Right.Element.all) < Left;
end Is_Greater_Key_Node;
----------------------
-- Is_Less_Key_Node --
----------------------
function Is_Less_Key_Node
(Left : Key_Type;
Right : Node_Access) return Boolean is
begin
return Left < Key (Right.Element.all);
end Is_Less_Key_Node;
---------
-- Key --
---------
function Key (Position : Cursor) return Key_Type is
begin
if Position.Node = null then
raise Constraint_Error with
"Position cursor equals No_Element";
end if;
if Position.Node.Element = null then
raise Program_Error with
"Position cursor is bad";
end if;
pragma Assert (Vet (Position.Container.Tree, Position.Node),
"bad cursor in Key");
return Key (Position.Node.Element.all);
end Key;
-------------
-- Replace --
-------------
procedure Replace
(Container : in out Set;
Key : Key_Type;
New_Item : Element_Type)
is
Node : constant Node_Access := Key_Keys.Find (Container.Tree, Key);
begin
if Node = null then
raise Constraint_Error with
"attempt to replace key not in set";
end if;
Replace_Element (Container.Tree, Node, New_Item);
end Replace;
-----------------------------------
-- Update_Element_Preserving_Key --
-----------------------------------
procedure Update_Element_Preserving_Key
(Container : in out Set;
Position : Cursor;
Process : not null access
procedure (Element : in out Element_Type))
is
Tree : Tree_Type renames Container.Tree;
begin
if Position.Node = null then
raise Constraint_Error with "Position cursor equals No_Element";
end if;
if Position.Node.Element = null then
raise Program_Error with "Position cursor is bad";
end if;
if Position.Container /= Container'Unrestricted_Access then
raise Program_Error with "Position cursor designates wrong set";
end if;
pragma Assert (Vet (Container.Tree, Position.Node),
"bad cursor in Update_Element_Preserving_Key");
declare
E : Element_Type renames Position.Node.Element.all;
K : constant Key_Type := Key (E);
B : Natural renames Tree.Busy;
L : Natural renames Tree.Lock;
begin
B := B + 1;
L := L + 1;
begin
Process (E);
exception
when others =>
L := L - 1;
B := B - 1;
raise;
end;
L := L - 1;
B := B - 1;
if Equivalent_Keys (K, Key (E)) then
return;
end if;
end;
declare
X : Node_Access := Position.Node;
begin
Tree_Operations.Delete_Node_Sans_Free (Tree, X);
Free (X);
end;
raise Program_Error with "key was modified";
end Update_Element_Preserving_Key;
end Generic_Keys;
-----------------
-- Has_Element --
-----------------
function Has_Element (Position : Cursor) return Boolean is
begin
return Position /= No_Element;
end Has_Element;
-------------
-- Include --
-------------
procedure Include (Container : in out Set; New_Item : Element_Type) is
Position : Cursor;
Inserted : Boolean;
X : Element_Access;
begin
Insert (Container, New_Item, Position, Inserted);
if not Inserted then
if Container.Tree.Lock > 0 then
raise Program_Error with
"attempt to tamper with cursors (set is locked)";
end if;
X := Position.Node.Element;
Position.Node.Element := new Element_Type'(New_Item);
Free_Element (X);
end if;
end Include;
------------
-- Insert --
------------
procedure Insert
(Container : in out Set;
New_Item : Element_Type;
Position : out Cursor;
Inserted : out Boolean)
is
begin
Insert_Sans_Hint
(Container.Tree,
New_Item,
Position.Node,
Inserted);
Position.Container := Container'Unrestricted_Access;
end Insert;
procedure Insert (Container : in out Set; New_Item : Element_Type) is
Position : Cursor;
Inserted : Boolean;
begin
Insert (Container, New_Item, Position, Inserted);
if not Inserted then
raise Constraint_Error with
"attempt to insert element already in set";
end if;
end Insert;
----------------------
-- Insert_Sans_Hint --
----------------------
procedure Insert_Sans_Hint
(Tree : in out Tree_Type;
New_Item : Element_Type;
Node : out Node_Access;
Inserted : out Boolean)
is
function New_Node return Node_Access;
pragma Inline (New_Node);
procedure Insert_Post is
new Element_Keys.Generic_Insert_Post (New_Node);
procedure Conditional_Insert_Sans_Hint is
new Element_Keys.Generic_Conditional_Insert (Insert_Post);
--------------
-- New_Node --
--------------
function New_Node return Node_Access is
Element : Element_Access := new Element_Type'(New_Item);
begin
return new Node_Type'(Parent => null,
Left => null,
Right => null,
Color => Red_Black_Trees.Red,
Element => Element);
exception
when others =>
Free_Element (Element);
raise;
end New_Node;
-- Start of processing for Insert_Sans_Hint
begin
Conditional_Insert_Sans_Hint
(Tree,
New_Item,
Node,
Inserted);
end Insert_Sans_Hint;
----------------------
-- Insert_With_Hint --
----------------------
procedure Insert_With_Hint
(Dst_Tree : in out Tree_Type;
Dst_Hint : Node_Access;
Src_Node : Node_Access;
Dst_Node : out Node_Access)
is
Success : Boolean;
function New_Node return Node_Access;
procedure Insert_Post is
new Element_Keys.Generic_Insert_Post (New_Node);
procedure Insert_Sans_Hint is
new Element_Keys.Generic_Conditional_Insert (Insert_Post);
procedure Insert_With_Hint is
new Element_Keys.Generic_Conditional_Insert_With_Hint
(Insert_Post,
Insert_Sans_Hint);
--------------
-- New_Node --
--------------
function New_Node return Node_Access is
Element : Element_Access :=
new Element_Type'(Src_Node.Element.all);
Node : Node_Access;
begin
begin
Node := new Node_Type;
exception
when others =>
Free_Element (Element);
raise;
end;
Node.Element := Element;
return Node;
end New_Node;
-- Start of processing for Insert_With_Hint
begin
Insert_With_Hint
(Dst_Tree,
Dst_Hint,
Src_Node.Element.all,
Dst_Node,
Success);
end Insert_With_Hint;
------------------
-- Intersection --
------------------
procedure Intersection (Target : in out Set; Source : Set) is
begin
Set_Ops.Intersection (Target.Tree, Source.Tree);
end Intersection;
function Intersection (Left, Right : Set) return Set is
Tree : constant Tree_Type :=
Set_Ops.Intersection (Left.Tree, Right.Tree);
begin
return Set'(Controlled with Tree);
end Intersection;
--------------
-- Is_Empty --
--------------
function Is_Empty (Container : Set) return Boolean is
begin
return Container.Tree.Length = 0;
end Is_Empty;
-----------------------------
-- Is_Greater_Element_Node --
-----------------------------
function Is_Greater_Element_Node
(Left : Element_Type;
Right : Node_Access) return Boolean is
begin
-- e > node same as node < e
return Right.Element.all < Left;
end Is_Greater_Element_Node;
--------------------------
-- Is_Less_Element_Node --
--------------------------
function Is_Less_Element_Node
(Left : Element_Type;
Right : Node_Access) return Boolean is
begin
return Left < Right.Element.all;
end Is_Less_Element_Node;
-----------------------
-- Is_Less_Node_Node --
-----------------------
function Is_Less_Node_Node (L, R : Node_Access) return Boolean is
begin
return L.Element.all < R.Element.all;
end Is_Less_Node_Node;
---------------
-- Is_Subset --
---------------
function Is_Subset (Subset : Set; Of_Set : Set) return Boolean is
begin
return Set_Ops.Is_Subset (Subset => Subset.Tree, Of_Set => Of_Set.Tree);
end Is_Subset;
-------------
-- Iterate --
-------------
procedure Iterate
(Container : Set;
Process : not null access procedure (Position : Cursor))
is
procedure Process_Node (Node : Node_Access);
pragma Inline (Process_Node);
procedure Local_Iterate is
new Tree_Operations.Generic_Iteration (Process_Node);
------------------
-- Process_Node --
------------------
procedure Process_Node (Node : Node_Access) is
begin
Process (Cursor'(Container'Unrestricted_Access, Node));
end Process_Node;
T : Tree_Type renames Container.Tree'Unrestricted_Access.all;
B : Natural renames T.Busy;
-- Start of prccessing for Iterate
begin
B := B + 1;
begin
Local_Iterate (T);
exception
when others =>
B := B - 1;
raise;
end;
B := B - 1;
end Iterate;
----------
-- Last --
----------
function Last (Container : Set) return Cursor is
begin
if Container.Tree.Last = null then
return No_Element;
end if;
return Cursor'(Container'Unrestricted_Access, Container.Tree.Last);
end Last;
------------------
-- Last_Element --
------------------
function Last_Element (Container : Set) return Element_Type is
begin
if Container.Tree.Last = null then
raise Constraint_Error with "set is empty";
end if;
return Container.Tree.Last.Element.all;
end Last_Element;
----------
-- Left --
----------
function Left (Node : Node_Access) return Node_Access is
begin
return Node.Left;
end Left;
------------
-- Length --
------------
function Length (Container : Set) return Count_Type is
begin
return Container.Tree.Length;
end Length;
----------
-- Move --
----------
procedure Move is
new Tree_Operations.Generic_Move (Clear);
procedure Move (Target : in out Set; Source : in out Set) is
begin
Move (Target => Target.Tree, Source => Source.Tree);
end Move;
----------
-- Next --
----------
procedure Next (Position : in out Cursor) is
begin
Position := Next (Position);
end Next;
function Next (Position : Cursor) return Cursor is
begin
if Position = No_Element then
return No_Element;
end if;
if Position.Node.Element = null then
raise Program_Error with "Position cursor is bad";
end if;
pragma Assert (Vet (Position.Container.Tree, Position.Node),
"bad cursor in Next");
declare
Node : constant Node_Access :=
Tree_Operations.Next (Position.Node);
begin
if Node = null then
return No_Element;
end if;
return Cursor'(Position.Container, Node);
end;
end Next;
-------------
-- Overlap --
-------------
function Overlap (Left, Right : Set) return Boolean is
begin
return Set_Ops.Overlap (Left.Tree, Right.Tree);
end Overlap;
------------
-- Parent --
------------
function Parent (Node : Node_Access) return Node_Access is
begin
return Node.Parent;
end Parent;
--------------
-- Previous --
--------------
procedure Previous (Position : in out Cursor) is
begin
Position := Previous (Position);
end Previous;
function Previous (Position : Cursor) return Cursor is
begin
if Position = No_Element then
return No_Element;
end if;
if Position.Node.Element = null then
raise Program_Error with "Position cursor is bad";
end if;
pragma Assert (Vet (Position.Container.Tree, Position.Node),
"bad cursor in Previous");
declare
Node : constant Node_Access :=
Tree_Operations.Previous (Position.Node);
begin
if Node = null then
return No_Element;
end if;
return Cursor'(Position.Container, Node);
end;
end Previous;
-------------------
-- Query_Element --
-------------------
procedure Query_Element
(Position : Cursor;
Process : not null access procedure (Element : Element_Type))
is
begin
if Position.Node = null then
raise Constraint_Error with "Position cursor equals No_Element";
end if;
if Position.Node.Element = null then
raise Program_Error with "Position cursor is bad";
end if;
pragma Assert (Vet (Position.Container.Tree, Position.Node),
"bad cursor in Query_Element");
declare
T : Tree_Type renames Position.Container.Tree;
B : Natural renames T.Busy;
L : Natural renames T.Lock;
begin
B := B + 1;
L := L + 1;
begin
Process (Position.Node.Element.all);
exception
when others =>
L := L - 1;
B := B - 1;
raise;
end;
L := L - 1;
B := B - 1;
end;
end Query_Element;
----------
-- Read --
----------
procedure Read
(Stream : access Root_Stream_Type'Class;
Container : out Set)
is
function Read_Node
(Stream : access Root_Stream_Type'Class) return Node_Access;
pragma Inline (Read_Node);
procedure Read is
new Tree_Operations.Generic_Read (Clear, Read_Node);
---------------
-- Read_Node --
---------------
function Read_Node
(Stream : access Root_Stream_Type'Class) return Node_Access
is
Node : Node_Access := new Node_Type;
begin
Node.Element := new Element_Type'(Element_Type'Input (Stream));
return Node;
exception
when others =>
Free (Node); -- Note that Free deallocates elem too
raise;
end Read_Node;
-- Start of processing for Read
begin
Read (Stream, Container.Tree);
end Read;
procedure Read
(Stream : access Root_Stream_Type'Class;
Item : out Cursor)
is
begin
raise Program_Error with "attempt to stream set cursor";
end Read;
-------------
-- Replace --
-------------
procedure Replace (Container : in out Set; New_Item : Element_Type) is
Node : constant Node_Access :=
Element_Keys.Find (Container.Tree, New_Item);
X : Element_Access;
begin
if Node = null then
raise Constraint_Error with "attempt to replace element not in set";
end if;
if Container.Tree.Lock > 0 then
raise Program_Error with
"attempt to tamper with cursors (set is locked)";
end if;
X := Node.Element;
Node.Element := new Element_Type'(New_Item);
Free_Element (X);
end Replace;
---------------------
-- Replace_Element --
---------------------
procedure Replace_Element
(Tree : in out Tree_Type;
Node : Node_Access;
Item : Element_Type)
is
begin
if Item < Node.Element.all
or else Node.Element.all < Item
then
null;
else
if Tree.Lock > 0 then
raise Program_Error with
"attempt to tamper with cursors (set is locked)";
end if;
declare
X : Element_Access := Node.Element;
begin
Node.Element := new Element_Type'(Item);
Free_Element (X);
end;
return;
end if;
Tree_Operations.Delete_Node_Sans_Free (Tree, Node); -- Checks busy-bit
Insert_New_Item : declare
function New_Node return Node_Access;
pragma Inline (New_Node);
procedure Insert_Post is
new Element_Keys.Generic_Insert_Post (New_Node);
procedure Insert is
new Element_Keys.Generic_Conditional_Insert (Insert_Post);
--------------
-- New_Node --
--------------
function New_Node return Node_Access is
begin
Node.Element := new Element_Type'(Item); -- OK if fails
Node.Color := Red;
Node.Parent := null;
Node.Right := null;
Node.Left := null;
return Node;
end New_Node;
Result : Node_Access;
Inserted : Boolean;
X : Element_Access := Node.Element;
-- Start of processing for Insert_New_Item
begin
Attempt_Insert : begin
Insert
(Tree => Tree,
Key => Item,
Node => Result,
Success => Inserted); -- TODO: change name of formal param
exception
when others =>
Inserted := False;
end Attempt_Insert;
if Inserted then
pragma Assert (Result = Node);
Free_Element (X); -- OK if fails
return;
end if;
end Insert_New_Item;
Reinsert_Old_Element : declare
function New_Node return Node_Access;
pragma Inline (New_Node);
procedure Insert_Post is
new Element_Keys.Generic_Insert_Post (New_Node);
procedure Insert is
new Element_Keys.Generic_Conditional_Insert (Insert_Post);
--------------
-- New_Node --
--------------
function New_Node return Node_Access is
begin
Node.Color := Red;
Node.Parent := null;
Node.Right := null;
Node.Left := null;
return Node;
end New_Node;
Result : Node_Access;
Inserted : Boolean;
-- Start of processing for Reinsert_Old_Element
begin
Insert
(Tree => Tree,
Key => Node.Element.all,
Node => Result,
Success => Inserted); -- TODO: change name of formal param
exception
when others =>
null;
end Reinsert_Old_Element;
raise Program_Error with "attempt to replace existing element";
end Replace_Element;
procedure Replace_Element
(Container : in out Set;
Position : Cursor;
New_Item : Element_Type)
is
begin
if Position.Node = null then
raise Constraint_Error with "Position cursor equals No_Element";
end if;
if Position.Node.Element = null then
raise Program_Error with "Position cursor is bad";
end if;
if Position.Container /= Container'Unrestricted_Access then
raise Program_Error with "Position cursor designates wrong set";
end if;
pragma Assert (Vet (Container.Tree, Position.Node),
"bad cursor in Replace_Element");
Replace_Element (Container.Tree, Position.Node, New_Item);
end Replace_Element;
---------------------
-- Reverse_Iterate --
---------------------
procedure Reverse_Iterate
(Container : Set;
Process : not null access procedure (Position : Cursor))
is
procedure Process_Node (Node : Node_Access);
pragma Inline (Process_Node);
procedure Local_Reverse_Iterate is
new Tree_Operations.Generic_Reverse_Iteration (Process_Node);
------------------
-- Process_Node --
------------------
procedure Process_Node (Node : Node_Access) is
begin
Process (Cursor'(Container'Unrestricted_Access, Node));
end Process_Node;
T : Tree_Type renames Container.Tree'Unrestricted_Access.all;
B : Natural renames T.Busy;
-- Start of processing for Reverse_Iterate
begin
B := B + 1;
begin
Local_Reverse_Iterate (T);
exception
when others =>
B := B - 1;
raise;
end;
B := B - 1;
end Reverse_Iterate;
-----------
-- Right --
-----------
function Right (Node : Node_Access) return Node_Access is
begin
return Node.Right;
end Right;
---------------
-- Set_Color --
---------------
procedure Set_Color (Node : Node_Access; Color : Color_Type) is
begin
Node.Color := Color;
end Set_Color;
--------------
-- Set_Left --
--------------
procedure Set_Left (Node : Node_Access; Left : Node_Access) is
begin
Node.Left := Left;
end Set_Left;
----------------
-- Set_Parent --
----------------
procedure Set_Parent (Node : Node_Access; Parent : Node_Access) is
begin
Node.Parent := Parent;
end Set_Parent;
---------------
-- Set_Right --
---------------
procedure Set_Right (Node : Node_Access; Right : Node_Access) is
begin
Node.Right := Right;
end Set_Right;
--------------------------
-- Symmetric_Difference --
--------------------------
procedure Symmetric_Difference (Target : in out Set; Source : Set) is
begin
Set_Ops.Symmetric_Difference (Target.Tree, Source.Tree);
end Symmetric_Difference;
function Symmetric_Difference (Left, Right : Set) return Set is
Tree : constant Tree_Type :=
Set_Ops.Symmetric_Difference (Left.Tree, Right.Tree);
begin
return Set'(Controlled with Tree);
end Symmetric_Difference;
------------
-- To_Set --
------------
function To_Set (New_Item : Element_Type) return Set is
Tree : Tree_Type;
Node : Node_Access;
Inserted : Boolean;
begin
Insert_Sans_Hint (Tree, New_Item, Node, Inserted);
return Set'(Controlled with Tree);
end To_Set;
-----------
-- Union --
-----------
procedure Union (Target : in out Set; Source : Set) is
begin
Set_Ops.Union (Target.Tree, Source.Tree);
end Union;
function Union (Left, Right : Set) return Set is
Tree : constant Tree_Type :=
Set_Ops.Union (Left.Tree, Right.Tree);
begin
return Set'(Controlled with Tree);
end Union;
-----------
-- Write --
-----------
procedure Write
(Stream : access Root_Stream_Type'Class;
Container : Set)
is
procedure Write_Node
(Stream : access Root_Stream_Type'Class;
Node : Node_Access);
pragma Inline (Write_Node);
procedure Write is
new Tree_Operations.Generic_Write (Write_Node);
----------------
-- Write_Node --
----------------
procedure Write_Node
(Stream : access Root_Stream_Type'Class;
Node : Node_Access)
is
begin
Element_Type'Output (Stream, Node.Element.all);
end Write_Node;
-- Start of processing for Write
begin
Write (Stream, Container.Tree);
end Write;
procedure Write
(Stream : access Root_Stream_Type'Class;
Item : Cursor)
is
begin
raise Program_Error with "attempt to stream set cursor";
end Write;
end Ada.Containers.Indefinite_Ordered_Sets;
| 26.218732 | 79 | 0.547596 |
dca8968accd0bd5dfd3b7831d193b62746449267 | 10,723 | ads | Ada | source/nodes/program-nodes-procedure_body_declarations.ads | optikos/oasis | 9f64d46d26d964790d69f9db681c874cfb3bf96d | [
"MIT"
] | null | null | null | source/nodes/program-nodes-procedure_body_declarations.ads | optikos/oasis | 9f64d46d26d964790d69f9db681c874cfb3bf96d | [
"MIT"
] | null | null | null | source/nodes/program-nodes-procedure_body_declarations.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.Defining_Names;
with Program.Elements.Parameter_Specifications;
with Program.Elements.Aspect_Specifications;
with Program.Element_Vectors;
with Program.Elements.Exception_Handlers;
with Program.Elements.Expressions;
with Program.Elements.Procedure_Body_Declarations;
with Program.Element_Visitors;
package Program.Nodes.Procedure_Body_Declarations is
pragma Preelaborate;
type Procedure_Body_Declaration is
new Program.Nodes.Node
and Program.Elements.Procedure_Body_Declarations
.Procedure_Body_Declaration
and Program.Elements.Procedure_Body_Declarations
.Procedure_Body_Declaration_Text
with private;
function Create
(Not_Token : Program.Lexical_Elements.Lexical_Element_Access;
Overriding_Token : Program.Lexical_Elements.Lexical_Element_Access;
Procedure_Token : not null Program.Lexical_Elements
.Lexical_Element_Access;
Name : not null Program.Elements.Defining_Names
.Defining_Name_Access;
Left_Bracket_Token : Program.Lexical_Elements.Lexical_Element_Access;
Parameters : Program.Elements.Parameter_Specifications
.Parameter_Specification_Vector_Access;
Right_Bracket_Token : Program.Lexical_Elements.Lexical_Element_Access;
With_Token : Program.Lexical_Elements.Lexical_Element_Access;
Aspects : Program.Elements.Aspect_Specifications
.Aspect_Specification_Vector_Access;
Is_Token : not null Program.Lexical_Elements
.Lexical_Element_Access;
Declarations : Program.Element_Vectors.Element_Vector_Access;
Begin_Token : not null Program.Lexical_Elements
.Lexical_Element_Access;
Statements : not null Program.Element_Vectors
.Element_Vector_Access;
Exception_Token : Program.Lexical_Elements.Lexical_Element_Access;
Exception_Handlers : Program.Elements.Exception_Handlers
.Exception_Handler_Vector_Access;
End_Token : not null Program.Lexical_Elements
.Lexical_Element_Access;
End_Name : Program.Elements.Expressions.Expression_Access;
Semicolon_Token : not null Program.Lexical_Elements
.Lexical_Element_Access)
return Procedure_Body_Declaration;
type Implicit_Procedure_Body_Declaration is
new Program.Nodes.Node
and Program.Elements.Procedure_Body_Declarations
.Procedure_Body_Declaration
with private;
function Create
(Name : not null Program.Elements.Defining_Names
.Defining_Name_Access;
Parameters : Program.Elements.Parameter_Specifications
.Parameter_Specification_Vector_Access;
Aspects : Program.Elements.Aspect_Specifications
.Aspect_Specification_Vector_Access;
Declarations : Program.Element_Vectors.Element_Vector_Access;
Statements : not null Program.Element_Vectors
.Element_Vector_Access;
Exception_Handlers : Program.Elements.Exception_Handlers
.Exception_Handler_Vector_Access;
End_Name : Program.Elements.Expressions.Expression_Access;
Is_Part_Of_Implicit : Boolean := False;
Is_Part_Of_Inherited : Boolean := False;
Is_Part_Of_Instance : Boolean := False;
Has_Not : Boolean := False;
Has_Overriding : Boolean := False)
return Implicit_Procedure_Body_Declaration
with Pre =>
Is_Part_Of_Implicit or Is_Part_Of_Inherited or Is_Part_Of_Instance;
private
type Base_Procedure_Body_Declaration is
abstract new Program.Nodes.Node
and Program.Elements.Procedure_Body_Declarations
.Procedure_Body_Declaration
with record
Name : not null Program.Elements.Defining_Names
.Defining_Name_Access;
Parameters : Program.Elements.Parameter_Specifications
.Parameter_Specification_Vector_Access;
Aspects : Program.Elements.Aspect_Specifications
.Aspect_Specification_Vector_Access;
Declarations : Program.Element_Vectors.Element_Vector_Access;
Statements : not null Program.Element_Vectors
.Element_Vector_Access;
Exception_Handlers : Program.Elements.Exception_Handlers
.Exception_Handler_Vector_Access;
End_Name : Program.Elements.Expressions.Expression_Access;
end record;
procedure Initialize
(Self : aliased in out Base_Procedure_Body_Declaration'Class);
overriding procedure Visit
(Self : not null access Base_Procedure_Body_Declaration;
Visitor : in out Program.Element_Visitors.Element_Visitor'Class);
overriding function Name
(Self : Base_Procedure_Body_Declaration)
return not null Program.Elements.Defining_Names.Defining_Name_Access;
overriding function Parameters
(Self : Base_Procedure_Body_Declaration)
return Program.Elements.Parameter_Specifications
.Parameter_Specification_Vector_Access;
overriding function Aspects
(Self : Base_Procedure_Body_Declaration)
return Program.Elements.Aspect_Specifications
.Aspect_Specification_Vector_Access;
overriding function Declarations
(Self : Base_Procedure_Body_Declaration)
return Program.Element_Vectors.Element_Vector_Access;
overriding function Statements
(Self : Base_Procedure_Body_Declaration)
return not null Program.Element_Vectors.Element_Vector_Access;
overriding function Exception_Handlers
(Self : Base_Procedure_Body_Declaration)
return Program.Elements.Exception_Handlers
.Exception_Handler_Vector_Access;
overriding function End_Name
(Self : Base_Procedure_Body_Declaration)
return Program.Elements.Expressions.Expression_Access;
overriding function Is_Procedure_Body_Declaration_Element
(Self : Base_Procedure_Body_Declaration)
return Boolean;
overriding function Is_Declaration_Element
(Self : Base_Procedure_Body_Declaration)
return Boolean;
type Procedure_Body_Declaration is
new Base_Procedure_Body_Declaration
and Program.Elements.Procedure_Body_Declarations
.Procedure_Body_Declaration_Text
with record
Not_Token : Program.Lexical_Elements.Lexical_Element_Access;
Overriding_Token : Program.Lexical_Elements.Lexical_Element_Access;
Procedure_Token : not null Program.Lexical_Elements
.Lexical_Element_Access;
Left_Bracket_Token : Program.Lexical_Elements.Lexical_Element_Access;
Right_Bracket_Token : Program.Lexical_Elements.Lexical_Element_Access;
With_Token : Program.Lexical_Elements.Lexical_Element_Access;
Is_Token : not null Program.Lexical_Elements
.Lexical_Element_Access;
Begin_Token : not null Program.Lexical_Elements
.Lexical_Element_Access;
Exception_Token : Program.Lexical_Elements.Lexical_Element_Access;
End_Token : not null Program.Lexical_Elements
.Lexical_Element_Access;
Semicolon_Token : not null Program.Lexical_Elements
.Lexical_Element_Access;
end record;
overriding function To_Procedure_Body_Declaration_Text
(Self : aliased in out Procedure_Body_Declaration)
return Program.Elements.Procedure_Body_Declarations
.Procedure_Body_Declaration_Text_Access;
overriding function Not_Token
(Self : Procedure_Body_Declaration)
return Program.Lexical_Elements.Lexical_Element_Access;
overriding function Overriding_Token
(Self : Procedure_Body_Declaration)
return Program.Lexical_Elements.Lexical_Element_Access;
overriding function Procedure_Token
(Self : Procedure_Body_Declaration)
return not null Program.Lexical_Elements.Lexical_Element_Access;
overriding function Left_Bracket_Token
(Self : Procedure_Body_Declaration)
return Program.Lexical_Elements.Lexical_Element_Access;
overriding function Right_Bracket_Token
(Self : Procedure_Body_Declaration)
return Program.Lexical_Elements.Lexical_Element_Access;
overriding function With_Token
(Self : Procedure_Body_Declaration)
return Program.Lexical_Elements.Lexical_Element_Access;
overriding function Is_Token
(Self : Procedure_Body_Declaration)
return not null Program.Lexical_Elements.Lexical_Element_Access;
overriding function Begin_Token
(Self : Procedure_Body_Declaration)
return not null Program.Lexical_Elements.Lexical_Element_Access;
overriding function Exception_Token
(Self : Procedure_Body_Declaration)
return Program.Lexical_Elements.Lexical_Element_Access;
overriding function End_Token
(Self : Procedure_Body_Declaration)
return not null Program.Lexical_Elements.Lexical_Element_Access;
overriding function Semicolon_Token
(Self : Procedure_Body_Declaration)
return not null Program.Lexical_Elements.Lexical_Element_Access;
overriding function Has_Not
(Self : Procedure_Body_Declaration)
return Boolean;
overriding function Has_Overriding
(Self : Procedure_Body_Declaration)
return Boolean;
type Implicit_Procedure_Body_Declaration is
new Base_Procedure_Body_Declaration
with record
Is_Part_Of_Implicit : Boolean;
Is_Part_Of_Inherited : Boolean;
Is_Part_Of_Instance : Boolean;
Has_Not : Boolean;
Has_Overriding : Boolean;
end record;
overriding function To_Procedure_Body_Declaration_Text
(Self : aliased in out Implicit_Procedure_Body_Declaration)
return Program.Elements.Procedure_Body_Declarations
.Procedure_Body_Declaration_Text_Access;
overriding function Is_Part_Of_Implicit
(Self : Implicit_Procedure_Body_Declaration)
return Boolean;
overriding function Is_Part_Of_Inherited
(Self : Implicit_Procedure_Body_Declaration)
return Boolean;
overriding function Is_Part_Of_Instance
(Self : Implicit_Procedure_Body_Declaration)
return Boolean;
overriding function Has_Not
(Self : Implicit_Procedure_Body_Declaration)
return Boolean;
overriding function Has_Overriding
(Self : Implicit_Procedure_Body_Declaration)
return Boolean;
end Program.Nodes.Procedure_Body_Declarations;
| 39.714815 | 78 | 0.740464 |
dc02513025915ce22765f017159a1d60ca0b3956 | 24,673 | ads | Ada | arch/ARM/Nordic/svd/nrf52/nrf_svd-comp.ads | shakram02/Ada_Drivers_Library | a407ca7ddbc2d9756647016c2f8fd8ef24a239ff | [
"BSD-3-Clause"
] | 192 | 2016-06-01T18:32:04.000Z | 2022-03-26T22:52:31.000Z | arch/ARM/Nordic/svd/nrf52/nrf_svd-comp.ads | shakram02/Ada_Drivers_Library | a407ca7ddbc2d9756647016c2f8fd8ef24a239ff | [
"BSD-3-Clause"
] | 239 | 2016-05-26T20:02:01.000Z | 2022-03-31T09:46:56.000Z | arch/ARM/Nordic/svd/nrf52/nrf_svd-comp.ads | shakram02/Ada_Drivers_Library | a407ca7ddbc2d9756647016c2f8fd8ef24a239ff | [
"BSD-3-Clause"
] | 142 | 2016-06-05T08:12:20.000Z | 2022-03-24T17:37:17.000Z | -- Copyright (c) 2010 - 2018, Nordic Semiconductor ASA
--
-- All rights reserved.
--
-- 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, except as embedded into a Nordic
-- Semiconductor ASA integrated circuit in a product or a software update for
-- such product, 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 Nordic Semiconductor ASA nor the names of its
-- contributors may be used to endorse or promote products derived from this
-- software without specific prior written permission.
--
-- 4. This software, with or without modification, must only be used with a
-- Nordic Semiconductor ASA integrated circuit.
--
-- 5. Any software provided in binary form under this license must not be reverse
-- engineered, decompiled, modified and/or disassembled.
--
-- THIS SOFTWARE IS PROVIDED BY NORDIC SEMICONDUCTOR ASA "AS IS" AND ANY EXPRESS
-- OR IMPLIED WARRANTIES, INCLUDING, BUT NOT LIMITED TO, THE IMPLIED WARRANTIES
-- OF MERCHANTABILITY, NONINFRINGEMENT, AND FITNESS FOR A PARTICULAR PURPOSE ARE
-- DISCLAIMED. IN NO EVENT SHALL NORDIC SEMICONDUCTOR ASA 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 spec has been automatically generated from nrf52.svd
pragma Restrictions (No_Elaboration_Code);
pragma Ada_2012;
pragma Style_Checks (Off);
with HAL;
with System;
package NRF_SVD.COMP is
pragma Preelaborate;
---------------
-- Registers --
---------------
-- Shortcut between READY event and SAMPLE task
type SHORTS_READY_SAMPLE_Field is
(-- Disable shortcut
Disabled,
-- Enable shortcut
Enabled)
with Size => 1;
for SHORTS_READY_SAMPLE_Field use
(Disabled => 0,
Enabled => 1);
-- Shortcut between READY event and STOP task
type SHORTS_READY_STOP_Field is
(-- Disable shortcut
Disabled,
-- Enable shortcut
Enabled)
with Size => 1;
for SHORTS_READY_STOP_Field use
(Disabled => 0,
Enabled => 1);
-- Shortcut between DOWN event and STOP task
type SHORTS_DOWN_STOP_Field is
(-- Disable shortcut
Disabled,
-- Enable shortcut
Enabled)
with Size => 1;
for SHORTS_DOWN_STOP_Field use
(Disabled => 0,
Enabled => 1);
-- Shortcut between UP event and STOP task
type SHORTS_UP_STOP_Field is
(-- Disable shortcut
Disabled,
-- Enable shortcut
Enabled)
with Size => 1;
for SHORTS_UP_STOP_Field use
(Disabled => 0,
Enabled => 1);
-- Shortcut between CROSS event and STOP task
type SHORTS_CROSS_STOP_Field is
(-- Disable shortcut
Disabled,
-- Enable shortcut
Enabled)
with Size => 1;
for SHORTS_CROSS_STOP_Field use
(Disabled => 0,
Enabled => 1);
-- Shortcut register
type SHORTS_Register is record
-- Shortcut between READY event and SAMPLE task
READY_SAMPLE : SHORTS_READY_SAMPLE_Field := NRF_SVD.COMP.Disabled;
-- Shortcut between READY event and STOP task
READY_STOP : SHORTS_READY_STOP_Field := NRF_SVD.COMP.Disabled;
-- Shortcut between DOWN event and STOP task
DOWN_STOP : SHORTS_DOWN_STOP_Field := NRF_SVD.COMP.Disabled;
-- Shortcut between UP event and STOP task
UP_STOP : SHORTS_UP_STOP_Field := NRF_SVD.COMP.Disabled;
-- Shortcut between CROSS event and STOP task
CROSS_STOP : SHORTS_CROSS_STOP_Field := NRF_SVD.COMP.Disabled;
-- unspecified
Reserved_5_31 : HAL.UInt27 := 16#0#;
end record
with Volatile_Full_Access, Object_Size => 32,
Bit_Order => System.Low_Order_First;
for SHORTS_Register use record
READY_SAMPLE at 0 range 0 .. 0;
READY_STOP at 0 range 1 .. 1;
DOWN_STOP at 0 range 2 .. 2;
UP_STOP at 0 range 3 .. 3;
CROSS_STOP at 0 range 4 .. 4;
Reserved_5_31 at 0 range 5 .. 31;
end record;
-- Enable or disable interrupt for READY event
type INTEN_READY_Field is
(-- Disable
Disabled,
-- Enable
Enabled)
with Size => 1;
for INTEN_READY_Field use
(Disabled => 0,
Enabled => 1);
-- Enable or disable interrupt for DOWN event
type INTEN_DOWN_Field is
(-- Disable
Disabled,
-- Enable
Enabled)
with Size => 1;
for INTEN_DOWN_Field use
(Disabled => 0,
Enabled => 1);
-- Enable or disable interrupt for UP event
type INTEN_UP_Field is
(-- Disable
Disabled,
-- Enable
Enabled)
with Size => 1;
for INTEN_UP_Field use
(Disabled => 0,
Enabled => 1);
-- Enable or disable interrupt for CROSS event
type INTEN_CROSS_Field is
(-- Disable
Disabled,
-- Enable
Enabled)
with Size => 1;
for INTEN_CROSS_Field use
(Disabled => 0,
Enabled => 1);
-- Enable or disable interrupt
type INTEN_Register is record
-- Enable or disable interrupt for READY event
READY : INTEN_READY_Field := NRF_SVD.COMP.Disabled;
-- Enable or disable interrupt for DOWN event
DOWN : INTEN_DOWN_Field := NRF_SVD.COMP.Disabled;
-- Enable or disable interrupt for UP event
UP : INTEN_UP_Field := NRF_SVD.COMP.Disabled;
-- Enable or disable interrupt for CROSS event
CROSS : INTEN_CROSS_Field := NRF_SVD.COMP.Disabled;
-- unspecified
Reserved_4_31 : HAL.UInt28 := 16#0#;
end record
with Volatile_Full_Access, Object_Size => 32,
Bit_Order => System.Low_Order_First;
for INTEN_Register use record
READY at 0 range 0 .. 0;
DOWN at 0 range 1 .. 1;
UP at 0 range 2 .. 2;
CROSS at 0 range 3 .. 3;
Reserved_4_31 at 0 range 4 .. 31;
end record;
-- Write '1' to Enable interrupt for READY event
type INTENSET_READY_Field is
(-- Read: Disabled
Disabled,
-- Read: Enabled
Enabled)
with Size => 1;
for INTENSET_READY_Field use
(Disabled => 0,
Enabled => 1);
-- Write '1' to Enable interrupt for READY event
type INTENSET_READY_Field_1 is
(-- Reset value for the field
Intenset_Ready_Field_Reset,
-- Enable
Set)
with Size => 1;
for INTENSET_READY_Field_1 use
(Intenset_Ready_Field_Reset => 0,
Set => 1);
-- Write '1' to Enable interrupt for DOWN event
type INTENSET_DOWN_Field is
(-- Read: Disabled
Disabled,
-- Read: Enabled
Enabled)
with Size => 1;
for INTENSET_DOWN_Field use
(Disabled => 0,
Enabled => 1);
-- Write '1' to Enable interrupt for DOWN event
type INTENSET_DOWN_Field_1 is
(-- Reset value for the field
Intenset_Down_Field_Reset,
-- Enable
Set)
with Size => 1;
for INTENSET_DOWN_Field_1 use
(Intenset_Down_Field_Reset => 0,
Set => 1);
-- Write '1' to Enable interrupt for UP event
type INTENSET_UP_Field is
(-- Read: Disabled
Disabled,
-- Read: Enabled
Enabled)
with Size => 1;
for INTENSET_UP_Field use
(Disabled => 0,
Enabled => 1);
-- Write '1' to Enable interrupt for UP event
type INTENSET_UP_Field_1 is
(-- Reset value for the field
Intenset_Up_Field_Reset,
-- Enable
Set)
with Size => 1;
for INTENSET_UP_Field_1 use
(Intenset_Up_Field_Reset => 0,
Set => 1);
-- Write '1' to Enable interrupt for CROSS event
type INTENSET_CROSS_Field is
(-- Read: Disabled
Disabled,
-- Read: Enabled
Enabled)
with Size => 1;
for INTENSET_CROSS_Field use
(Disabled => 0,
Enabled => 1);
-- Write '1' to Enable interrupt for CROSS event
type INTENSET_CROSS_Field_1 is
(-- Reset value for the field
Intenset_Cross_Field_Reset,
-- Enable
Set)
with Size => 1;
for INTENSET_CROSS_Field_1 use
(Intenset_Cross_Field_Reset => 0,
Set => 1);
-- Enable interrupt
type INTENSET_Register is record
-- Write '1' to Enable interrupt for READY event
READY : INTENSET_READY_Field_1 := Intenset_Ready_Field_Reset;
-- Write '1' to Enable interrupt for DOWN event
DOWN : INTENSET_DOWN_Field_1 := Intenset_Down_Field_Reset;
-- Write '1' to Enable interrupt for UP event
UP : INTENSET_UP_Field_1 := Intenset_Up_Field_Reset;
-- Write '1' to Enable interrupt for CROSS event
CROSS : INTENSET_CROSS_Field_1 := Intenset_Cross_Field_Reset;
-- unspecified
Reserved_4_31 : HAL.UInt28 := 16#0#;
end record
with Volatile_Full_Access, Object_Size => 32,
Bit_Order => System.Low_Order_First;
for INTENSET_Register use record
READY at 0 range 0 .. 0;
DOWN at 0 range 1 .. 1;
UP at 0 range 2 .. 2;
CROSS at 0 range 3 .. 3;
Reserved_4_31 at 0 range 4 .. 31;
end record;
-- Write '1' to Disable interrupt for READY event
type INTENCLR_READY_Field is
(-- Read: Disabled
Disabled,
-- Read: Enabled
Enabled)
with Size => 1;
for INTENCLR_READY_Field use
(Disabled => 0,
Enabled => 1);
-- Write '1' to Disable interrupt for READY event
type INTENCLR_READY_Field_1 is
(-- Reset value for the field
Intenclr_Ready_Field_Reset,
-- Disable
Clear)
with Size => 1;
for INTENCLR_READY_Field_1 use
(Intenclr_Ready_Field_Reset => 0,
Clear => 1);
-- Write '1' to Disable interrupt for DOWN event
type INTENCLR_DOWN_Field is
(-- Read: Disabled
Disabled,
-- Read: Enabled
Enabled)
with Size => 1;
for INTENCLR_DOWN_Field use
(Disabled => 0,
Enabled => 1);
-- Write '1' to Disable interrupt for DOWN event
type INTENCLR_DOWN_Field_1 is
(-- Reset value for the field
Intenclr_Down_Field_Reset,
-- Disable
Clear)
with Size => 1;
for INTENCLR_DOWN_Field_1 use
(Intenclr_Down_Field_Reset => 0,
Clear => 1);
-- Write '1' to Disable interrupt for UP event
type INTENCLR_UP_Field is
(-- Read: Disabled
Disabled,
-- Read: Enabled
Enabled)
with Size => 1;
for INTENCLR_UP_Field use
(Disabled => 0,
Enabled => 1);
-- Write '1' to Disable interrupt for UP event
type INTENCLR_UP_Field_1 is
(-- Reset value for the field
Intenclr_Up_Field_Reset,
-- Disable
Clear)
with Size => 1;
for INTENCLR_UP_Field_1 use
(Intenclr_Up_Field_Reset => 0,
Clear => 1);
-- Write '1' to Disable interrupt for CROSS event
type INTENCLR_CROSS_Field is
(-- Read: Disabled
Disabled,
-- Read: Enabled
Enabled)
with Size => 1;
for INTENCLR_CROSS_Field use
(Disabled => 0,
Enabled => 1);
-- Write '1' to Disable interrupt for CROSS event
type INTENCLR_CROSS_Field_1 is
(-- Reset value for the field
Intenclr_Cross_Field_Reset,
-- Disable
Clear)
with Size => 1;
for INTENCLR_CROSS_Field_1 use
(Intenclr_Cross_Field_Reset => 0,
Clear => 1);
-- Disable interrupt
type INTENCLR_Register is record
-- Write '1' to Disable interrupt for READY event
READY : INTENCLR_READY_Field_1 := Intenclr_Ready_Field_Reset;
-- Write '1' to Disable interrupt for DOWN event
DOWN : INTENCLR_DOWN_Field_1 := Intenclr_Down_Field_Reset;
-- Write '1' to Disable interrupt for UP event
UP : INTENCLR_UP_Field_1 := Intenclr_Up_Field_Reset;
-- Write '1' to Disable interrupt for CROSS event
CROSS : INTENCLR_CROSS_Field_1 := Intenclr_Cross_Field_Reset;
-- unspecified
Reserved_4_31 : HAL.UInt28 := 16#0#;
end record
with Volatile_Full_Access, Object_Size => 32,
Bit_Order => System.Low_Order_First;
for INTENCLR_Register use record
READY at 0 range 0 .. 0;
DOWN at 0 range 1 .. 1;
UP at 0 range 2 .. 2;
CROSS at 0 range 3 .. 3;
Reserved_4_31 at 0 range 4 .. 31;
end record;
-- Result of last compare. Decision point SAMPLE task.
type RESULT_RESULT_Field is
(-- Input voltage is below the threshold (VIN+ < VIN-)
Below,
-- Input voltage is above the threshold (VIN+ > VIN-)
Above)
with Size => 1;
for RESULT_RESULT_Field use
(Below => 0,
Above => 1);
-- Compare result
type RESULT_Register is record
-- Read-only. Result of last compare. Decision point SAMPLE task.
RESULT : RESULT_RESULT_Field;
-- unspecified
Reserved_1_31 : HAL.UInt31;
end record
with Volatile_Full_Access, Object_Size => 32,
Bit_Order => System.Low_Order_First;
for RESULT_Register use record
RESULT at 0 range 0 .. 0;
Reserved_1_31 at 0 range 1 .. 31;
end record;
-- Enable or disable COMP
type ENABLE_ENABLE_Field is
(-- Disable
Disabled,
-- Enable
Enabled)
with Size => 2;
for ENABLE_ENABLE_Field use
(Disabled => 0,
Enabled => 2);
-- COMP enable
type ENABLE_Register is record
-- Enable or disable COMP
ENABLE : ENABLE_ENABLE_Field := NRF_SVD.COMP.Disabled;
-- unspecified
Reserved_2_31 : HAL.UInt30 := 16#0#;
end record
with Volatile_Full_Access, Object_Size => 32,
Bit_Order => System.Low_Order_First;
for ENABLE_Register use record
ENABLE at 0 range 0 .. 1;
Reserved_2_31 at 0 range 2 .. 31;
end record;
-- Analog pin select
type PSEL_PSEL_Field is
(-- AIN0 selected as analog input
Analoginput0,
-- AIN1 selected as analog input
Analoginput1,
-- AIN2 selected as analog input
Analoginput2,
-- AIN3 selected as analog input
Analoginput3,
-- AIN4 selected as analog input
Analoginput4,
-- AIN5 selected as analog input
Analoginput5,
-- AIN6 selected as analog input
Analoginput6,
-- AIN7 selected as analog input
Analoginput7)
with Size => 3;
for PSEL_PSEL_Field use
(Analoginput0 => 0,
Analoginput1 => 1,
Analoginput2 => 2,
Analoginput3 => 3,
Analoginput4 => 4,
Analoginput5 => 5,
Analoginput6 => 6,
Analoginput7 => 7);
-- Pin select
type PSEL_Register is record
-- Analog pin select
PSEL : PSEL_PSEL_Field := NRF_SVD.COMP.Analoginput0;
-- unspecified
Reserved_3_31 : HAL.UInt29 := 16#0#;
end record
with Volatile_Full_Access, Object_Size => 32,
Bit_Order => System.Low_Order_First;
for PSEL_Register use record
PSEL at 0 range 0 .. 2;
Reserved_3_31 at 0 range 3 .. 31;
end record;
-- Reference select
type REFSEL_REFSEL_Field is
(-- VREF = internal 1.2 V reference (VDD >= 1.7 V)
Int1V2,
-- VREF = internal 1.8 V reference (VDD >= VREF + 0.2 V)
Int1V8,
-- VREF = internal 2.4 V reference (VDD >= VREF + 0.2 V)
Int2V4,
-- VREF = VDD
Vdd,
-- VREF = AREF (VDD >= VREF >= AREFMIN)
Aref)
with Size => 3;
for REFSEL_REFSEL_Field use
(Int1V2 => 0,
Int1V8 => 1,
Int2V4 => 2,
Vdd => 4,
Aref => 7);
-- Reference source select for single-ended mode
type REFSEL_Register is record
-- Reference select
REFSEL : REFSEL_REFSEL_Field := NRF_SVD.COMP.Vdd;
-- unspecified
Reserved_3_31 : HAL.UInt29 := 16#0#;
end record
with Volatile_Full_Access, Object_Size => 32,
Bit_Order => System.Low_Order_First;
for REFSEL_Register use record
REFSEL at 0 range 0 .. 2;
Reserved_3_31 at 0 range 3 .. 31;
end record;
-- External analog reference select
type EXTREFSEL_EXTREFSEL_Field is
(-- Use AIN0 as external analog reference
Analogreference0,
-- Use AIN1 as external analog reference
Analogreference1,
-- Use AIN2 as external analog reference
Analogreference2,
-- Use AIN3 as external analog reference
Analogreference3,
-- Use AIN4 as external analog reference
Analogreference4,
-- Use AIN5 as external analog reference
Analogreference5,
-- Use AIN6 as external analog reference
Analogreference6,
-- Use AIN7 as external analog reference
Analogreference7)
with Size => 3;
for EXTREFSEL_EXTREFSEL_Field use
(Analogreference0 => 0,
Analogreference1 => 1,
Analogreference2 => 2,
Analogreference3 => 3,
Analogreference4 => 4,
Analogreference5 => 5,
Analogreference6 => 6,
Analogreference7 => 7);
-- External reference select
type EXTREFSEL_Register is record
-- External analog reference select
EXTREFSEL : EXTREFSEL_EXTREFSEL_Field :=
NRF_SVD.COMP.Analogreference0;
-- unspecified
Reserved_3_31 : HAL.UInt29 := 16#0#;
end record
with Volatile_Full_Access, Object_Size => 32,
Bit_Order => System.Low_Order_First;
for EXTREFSEL_Register use record
EXTREFSEL at 0 range 0 .. 2;
Reserved_3_31 at 0 range 3 .. 31;
end record;
subtype TH_THDOWN_Field is HAL.UInt6;
subtype TH_THUP_Field is HAL.UInt6;
-- Threshold configuration for hysteresis unit
type TH_Register is record
-- VDOWN = (THDOWN+1)/64*VREF
THDOWN : TH_THDOWN_Field := 16#0#;
-- unspecified
Reserved_6_7 : HAL.UInt2 := 16#0#;
-- VUP = (THUP+1)/64*VREF
THUP : TH_THUP_Field := 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 TH_Register use record
THDOWN at 0 range 0 .. 5;
Reserved_6_7 at 0 range 6 .. 7;
THUP at 0 range 8 .. 13;
Reserved_14_31 at 0 range 14 .. 31;
end record;
-- Speed and power modes
type MODE_SP_Field is
(-- Low-power mode
Low,
-- Normal mode
Normal,
-- High-speed mode
High)
with Size => 2;
for MODE_SP_Field use
(Low => 0,
Normal => 1,
High => 2);
-- Main operation modes
type MODE_MAIN_Field is
(-- Single-ended mode
Se,
-- Differential mode
Diff)
with Size => 1;
for MODE_MAIN_Field use
(Se => 0,
Diff => 1);
-- Mode configuration
type MODE_Register is record
-- Speed and power modes
SP : MODE_SP_Field := NRF_SVD.COMP.Low;
-- unspecified
Reserved_2_7 : HAL.UInt6 := 16#0#;
-- Main operation modes
MAIN : MODE_MAIN_Field := NRF_SVD.COMP.Se;
-- unspecified
Reserved_9_31 : HAL.UInt23 := 16#0#;
end record
with Volatile_Full_Access, Object_Size => 32,
Bit_Order => System.Low_Order_First;
for MODE_Register use record
SP at 0 range 0 .. 1;
Reserved_2_7 at 0 range 2 .. 7;
MAIN at 0 range 8 .. 8;
Reserved_9_31 at 0 range 9 .. 31;
end record;
-- Comparator hysteresis
type HYST_HYST_Field is
(-- Comparator hysteresis disabled
Nohyst,
-- Comparator hysteresis enabled
Hyst50MV)
with Size => 1;
for HYST_HYST_Field use
(Nohyst => 0,
Hyst50MV => 1);
-- Comparator hysteresis enable
type HYST_Register is record
-- Comparator hysteresis
HYST : HYST_HYST_Field := NRF_SVD.COMP.Nohyst;
-- unspecified
Reserved_1_31 : HAL.UInt31 := 16#0#;
end record
with Volatile_Full_Access, Object_Size => 32,
Bit_Order => System.Low_Order_First;
for HYST_Register use record
HYST at 0 range 0 .. 0;
Reserved_1_31 at 0 range 1 .. 31;
end record;
-- Comparator hysteresis
type ISOURCE_ISOURCE_Field is
(-- Current source disabled
Off,
-- Current source enabled (+/- 2.5 uA)
Ien2MA5,
-- Current source enabled (+/- 5 uA)
Ien5MA,
-- Current source enabled (+/- 10 uA)
Ien10MA)
with Size => 2;
for ISOURCE_ISOURCE_Field use
(Off => 0,
Ien2MA5 => 1,
Ien5MA => 2,
Ien10MA => 3);
-- Current source select on analog input
type ISOURCE_Register is record
-- Comparator hysteresis
ISOURCE : ISOURCE_ISOURCE_Field := NRF_SVD.COMP.Off;
-- unspecified
Reserved_2_31 : HAL.UInt30 := 16#0#;
end record
with Volatile_Full_Access, Object_Size => 32,
Bit_Order => System.Low_Order_First;
for ISOURCE_Register use record
ISOURCE at 0 range 0 .. 1;
Reserved_2_31 at 0 range 2 .. 31;
end record;
-----------------
-- Peripherals --
-----------------
-- Comparator
type COMP_Peripheral is record
-- Start comparator
TASKS_START : aliased HAL.UInt32;
-- Stop comparator
TASKS_STOP : aliased HAL.UInt32;
-- Sample comparator value
TASKS_SAMPLE : aliased HAL.UInt32;
-- COMP is ready and output is valid
EVENTS_READY : aliased HAL.UInt32;
-- Downward crossing
EVENTS_DOWN : aliased HAL.UInt32;
-- Upward crossing
EVENTS_UP : aliased HAL.UInt32;
-- Downward or upward crossing
EVENTS_CROSS : aliased HAL.UInt32;
-- Shortcut register
SHORTS : aliased SHORTS_Register;
-- Enable or disable interrupt
INTEN : aliased INTEN_Register;
-- Enable interrupt
INTENSET : aliased INTENSET_Register;
-- Disable interrupt
INTENCLR : aliased INTENCLR_Register;
-- Compare result
RESULT : aliased RESULT_Register;
-- COMP enable
ENABLE : aliased ENABLE_Register;
-- Pin select
PSEL : aliased PSEL_Register;
-- Reference source select for single-ended mode
REFSEL : aliased REFSEL_Register;
-- External reference select
EXTREFSEL : aliased EXTREFSEL_Register;
-- Threshold configuration for hysteresis unit
TH : aliased TH_Register;
-- Mode configuration
MODE : aliased MODE_Register;
-- Comparator hysteresis enable
HYST : aliased HYST_Register;
-- Current source select on analog input
ISOURCE : aliased ISOURCE_Register;
end record
with Volatile;
for COMP_Peripheral use record
TASKS_START at 16#0# range 0 .. 31;
TASKS_STOP at 16#4# range 0 .. 31;
TASKS_SAMPLE at 16#8# range 0 .. 31;
EVENTS_READY at 16#100# range 0 .. 31;
EVENTS_DOWN at 16#104# range 0 .. 31;
EVENTS_UP at 16#108# range 0 .. 31;
EVENTS_CROSS at 16#10C# range 0 .. 31;
SHORTS at 16#200# range 0 .. 31;
INTEN at 16#300# range 0 .. 31;
INTENSET at 16#304# range 0 .. 31;
INTENCLR at 16#308# range 0 .. 31;
RESULT at 16#400# range 0 .. 31;
ENABLE at 16#500# range 0 .. 31;
PSEL at 16#504# range 0 .. 31;
REFSEL at 16#508# range 0 .. 31;
EXTREFSEL at 16#50C# range 0 .. 31;
TH at 16#530# range 0 .. 31;
MODE at 16#534# range 0 .. 31;
HYST at 16#538# range 0 .. 31;
ISOURCE at 16#53C# range 0 .. 31;
end record;
-- Comparator
COMP_Periph : aliased COMP_Peripheral
with Import, Address => COMP_Base;
end NRF_SVD.COMP;
| 30.460494 | 84 | 0.614883 |
dcb5a65ad0576a327420972951e6c417805de7a0 | 117 | adb | Ada | gcc-gcc-7_3_0-release/gcc/testsuite/gnat.dg/wide_pi.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/wide_pi.adb | best08618/asylo | 5a520a9f5c461ede0f32acc284017b737a43898c | [
"Apache-2.0"
] | null | null | null | gcc-gcc-7_3_0-release/gcc/testsuite/gnat.dg/wide_pi.adb | best08618/asylo | 5a520a9f5c461ede0f32acc284017b737a43898c | [
"Apache-2.0"
] | 2 | 2020-07-27T00:22:36.000Z | 2021-04-01T09:41:02.000Z | -- { dg-do compile }
-- { dg-options "-gnatW8" }
with Ada.Numerics;
procedure wide_pi is
begin
null;
end;
| 11.7 | 27 | 0.606838 |
d039e8f23cffcb48c5fda077c29fc8c6f5c81b6f | 1,527 | ads | Ada | bb-runtimes/runtimes/ravenscar-sfp-stm32f3x4/gnarl/s-multip.ads | JCGobbi/Nucleo-STM32F334R8 | 2a0b1b4b2664c92773703ac5e95dcb71979d051c | [
"BSD-3-Clause"
] | null | null | null | bb-runtimes/runtimes/ravenscar-sfp-stm32f3x4/gnarl/s-multip.ads | JCGobbi/Nucleo-STM32F334R8 | 2a0b1b4b2664c92773703ac5e95dcb71979d051c | [
"BSD-3-Clause"
] | null | null | null | bb-runtimes/runtimes/ravenscar-sfp-stm32f3x4/gnarl/s-multip.ads | JCGobbi/Nucleo-STM32F334R8 | 2a0b1b4b2664c92773703ac5e95dcb71979d051c | [
"BSD-3-Clause"
] | null | null | null | ------------------------------------------------------------------------------
-- --
-- GNAT COMPILER COMPONENTS --
-- --
-- S Y S T E M . M U L T I P R O C E S S O R S --
-- --
-- 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. --
-- --
------------------------------------------------------------------------------
with System.BB.Parameters;
package System.Multiprocessors is
pragma Preelaborate (Multiprocessors);
type CPU_Range is range 0 .. System.BB.Parameters.Max_Number_Of_CPUs;
subtype CPU is CPU_Range range 1 .. CPU_Range'Last;
Not_A_Specific_CPU : constant CPU_Range := 0;
function Number_Of_CPUs return CPU;
pragma Inline (Number_Of_CPUs);
-- Number of available CPUs
end System.Multiprocessors;
| 47.71875 | 78 | 0.396202 |
dccd8b673096f8577c1bd85136f24a7cb2c7c1ca | 2,280 | ads | Ada | tools/scitools/conf/understand/ada/ada05/s-sopco3.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/ada05/s-sopco3.ads | brucegua/moocos | 575c161cfa35e220f10d042e2e5ca18773691695 | [
"Apache-2.0"
] | null | null | null | tools/scitools/conf/understand/ada/ada05/s-sopco3.ads | brucegua/moocos | 575c161cfa35e220f10d042e2e5ca18773691695 | [
"Apache-2.0"
] | null | null | null | ------------------------------------------------------------------------------
-- --
-- GNAT RUN-TIME COMPONENTS --
-- --
-- S Y S T E M . S T R I N G _ O P S _ C O N C A T _ 3 --
-- --
-- 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. --
-- --
--
--
--
--
--
--
--
-- 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 function for concatenating three strings
package System.String_Ops_Concat_3 is
pragma Pure;
function Str_Concat_3 (S1, S2, S3 : String) return String;
-- Concatenate three strings and return resulting string
end System.String_Ops_Concat_3;
| 53.023256 | 78 | 0.418421 |
18b15806904c3d791f194c9681659d64895ab010 | 21,683 | ads | Ada | src/gen/gstreamer-gst_low_level-gstreamer_0_10_gst_gstindex_h.ads | persan/A-gst | 7a39693d105617adea52680424c862a1a08f7368 | [
"Apache-2.0"
] | 1 | 2018-01-18T00:51:00.000Z | 2018-01-18T00:51:00.000Z | src/gen/gstreamer-gst_low_level-gstreamer_0_10_gst_gstindex_h.ads | persan/A-gst | 7a39693d105617adea52680424c862a1a08f7368 | [
"Apache-2.0"
] | null | null | null | src/gen/gstreamer-gst_low_level-gstreamer_0_10_gst_gstindex_h.ads | persan/A-gst | 7a39693d105617adea52680424c862a1a08f7368 | [
"Apache-2.0"
] | null | null | null | pragma Ada_2005;
pragma Style_Checks (Off);
pragma Warnings (Off);
with Interfaces.C; use Interfaces.C;
with glib;
with glib.Values;
with System;
with System;
with glib;
with GStreamer.GST_Low_Level.gstreamer_0_10_gst_gstformat_h;
with GLIB; -- with GStreamer.GST_Low_Level.glibconfig_h;
-- limited with GStreamer.GST_Low_Level.glib_2_0_glib_glist_h;
with GStreamer.GST_Low_Level.gstreamer_0_10_gst_gstobject_h;
package GStreamer.GST_Low_Level.gstreamer_0_10_gst_gstindex_h is
-- unsupported macro: GST_TYPE_INDEX (gst_index_get_type ())
-- arg-macro: function GST_INDEX (obj)
-- return G_TYPE_CHECK_INSTANCE_CAST ((obj), GST_TYPE_INDEX, GstIndex);
-- arg-macro: function GST_IS_INDEX (obj)
-- return G_TYPE_CHECK_INSTANCE_TYPE ((obj), GST_TYPE_INDEX);
-- arg-macro: function GST_INDEX_CLASS (klass)
-- return G_TYPE_CHECK_CLASS_CAST ((klass), GST_TYPE_INDEX, GstIndexClass);
-- arg-macro: function GST_IS_INDEX_CLASS (klass)
-- return G_TYPE_CHECK_CLASS_TYPE ((klass), GST_TYPE_INDEX);
-- arg-macro: function GST_INDEX_GET_CLASS (obj)
-- return G_TYPE_INSTANCE_GET_CLASS ((obj), GST_TYPE_INDEX, GstIndexClass);
-- unsupported macro: GST_TYPE_INDEX_ENTRY (gst_index_entry_get_type())
-- arg-macro: function GST_INDEX_NASSOCS (entry)
-- return (entry).data.assoc.nassocs;
-- arg-macro: function GST_INDEX_ASSOC_FLAGS (entry)
-- return (entry).data.assoc.flags;
-- arg-macro: function GST_INDEX_ASSOC_FORMAT (entry, i)
-- return (entry).data.assoc.assocs((i)).format;
-- arg-macro: function GST_INDEX_ASSOC_VALUE (entry, i)
-- return (entry).data.assoc.assocs((i)).value;
-- arg-macro: function GST_INDEX_FORMAT_FORMAT (entry)
-- return (entry).data.format.format;
-- arg-macro: function GST_INDEX_FORMAT_KEY (entry)
-- return (entry).data.format.key;
GST_INDEX_ID_INVALID : constant := (-1); -- gst/gstindex.h:180
-- arg-macro: function GST_INDEX_ID_DESCRIPTION (entry)
-- return (entry).data.id.description;
-- arg-macro: function GST_INDEX_IS_READABLE (obj)
-- return GST_OBJECT_FLAG_IS_SET (obj, GST_INDEX_READABLE);
-- arg-macro: function GST_INDEX_IS_WRITABLE (obj)
-- return GST_OBJECT_FLAG_IS_SET (obj, GST_INDEX_WRITABLE);
-- GStreamer
-- * Copyright (C) 1999,2000 Erik Walthinsen <[email protected]>
-- * 2000 Wim Taymans <[email protected]>
-- *
-- * gstindex.h: Header for GstIndex, base class to handle efficient
-- * storage or caching of seeking information.
-- *
-- * This library is free software; you can redistribute it and/or
-- * modify it under the terms of the GNU Library General Public
-- * License as published by the Free Software Foundation; either
-- * version 2 of the License, 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. See the GNU
-- * Library General Public License for more details.
-- *
-- * You should have received a copy of the GNU Library General Public
-- * License along with this library; if not, write to the
-- * Free Software Foundation, Inc., 59 Temple Place - Suite 330,
-- * Boston, MA 02111-1307, USA.
--
-- new flags should start here
subtype GstAssocFlags is unsigned;
GST_ASSOCIATION_FLAG_NONE : constant GstAssocFlags := 0;
GST_ASSOCIATION_FLAG_KEY_UNIT : constant GstAssocFlags := 1;
GST_ASSOCIATION_FLAG_DELTA_UNIT : constant GstAssocFlags := 2;
GST_ASSOCIATION_FLAG_LAST : constant GstAssocFlags := 256; -- gst/gstindex.h:157
type GstIndexEntry;
type anon_222;
type anon_223 is record
description : access GLIB.gchar; -- gst/gstindex.h:202
end record;
pragma Convention (C_Pass_By_Copy, anon_223);
type anon_224 is record
nassocs : aliased GLIB.gint; -- gst/gstindex.h:205
assocs : System.Address; -- gst/gstindex.h:207
flags : aliased GstAssocFlags; -- gst/gstindex.h:208
end record;
pragma Convention (C_Pass_By_Copy, anon_224);
type anon_225 is record
key : access GLIB.gchar; -- gst/gstindex.h:211
c_type : aliased GLIB.GType; -- gst/gstindex.h:212
object : System.Address; -- gst/gstindex.h:213
end record;
pragma Convention (C_Pass_By_Copy, anon_225);
type anon_226 is record
format : aliased GStreamer.GST_Low_Level.gstreamer_0_10_gst_gstformat_h.GstFormat; -- gst/gstindex.h:216
key : access GLIB.gchar; -- gst/gstindex.h:217
end record;
pragma Convention (C_Pass_By_Copy, anon_226);
type anon_222 (discr : unsigned := 0) is record
case discr is
when 0 =>
id : aliased anon_223; -- gst/gstindex.h:203
when 1 =>
assoc : aliased anon_224; -- gst/gstindex.h:209
when 2 =>
object : aliased anon_225; -- gst/gstindex.h:214
when others =>
format : aliased anon_226; -- gst/gstindex.h:218
end case;
end record;
pragma Convention (C_Pass_By_Copy, anon_222);
pragma Unchecked_Union (anon_222);--subtype GstIndexEntry is u_GstIndexEntry; -- gst/gstindex.h:42
type GstIndexGroup;
--subtype GstIndexGroup is u_GstIndexGroup; -- gst/gstindex.h:43
type GstIndex;
type u_GstIndex_u_gst_reserved_array is array (0 .. 2) of System.Address;
--subtype GstIndex is u_GstIndex; -- gst/gstindex.h:44
type GstIndexClass;
type u_GstIndexClass_u_gst_reserved_array is array (0 .. 3) of System.Address;
--subtype GstIndexClass is u_GstIndexClass; -- gst/gstindex.h:45
--*
-- * GstIndexCertainty:
-- * @GST_INDEX_UNKNOWN: accuracy is not known
-- * @GST_INDEX_CERTAIN: accuracy is perfect
-- * @GST_INDEX_FUZZY: accuracy is fuzzy
-- *
-- * The certainty of a group in the index.
--
type GstIndexCertainty is
(GST_INDEX_UNKNOWN,
GST_INDEX_CERTAIN,
GST_INDEX_FUZZY);
pragma Convention (C, GstIndexCertainty); -- gst/gstindex.h:59
--*
-- * GstIndexEntryType:
-- * @GST_INDEX_ENTRY_ID: This entry is an id that maps an index id to its owner object
-- * @GST_INDEX_ENTRY_ASSOCIATION: This entry is an association between formats
-- * @GST_INDEX_ENTRY_OBJECT: An object
-- * @GST_INDEX_ENTRY_FORMAT: A format definition
-- *
-- * The different types of entries in the index.
--
type GstIndexEntryType is
(GST_INDEX_ENTRY_ID,
GST_INDEX_ENTRY_ASSOCIATION,
GST_INDEX_ENTRY_OBJECT,
GST_INDEX_ENTRY_FORMAT);
pragma Convention (C, GstIndexEntryType); -- gst/gstindex.h:75
--*
-- * GstIndexLookupMethod:
-- * @GST_INDEX_LOOKUP_EXACT: There has to be an exact indexentry with the given format/value
-- * @GST_INDEX_LOOKUP_BEFORE: The exact entry or the one before it
-- * @GST_INDEX_LOOKUP_AFTER: The exact entry or the one after it
-- *
-- * Specify the method to find an index entry in the index.
--
type GstIndexLookupMethod is
(GST_INDEX_LOOKUP_EXACT,
GST_INDEX_LOOKUP_BEFORE,
GST_INDEX_LOOKUP_AFTER);
pragma Convention (C, GstIndexLookupMethod); -- gst/gstindex.h:89
--*
-- * GST_INDEX_NASSOCS:
-- * @entry: The entry to query
-- *
-- * Get the number of associations in the entry.
--
--*
-- * GST_INDEX_ASSOC_FLAGS:
-- * @entry: The entry to query
-- *
-- * Get the flags for this entry.
--
--*
-- * GST_INDEX_ASSOC_FORMAT:
-- * @entry: The entry to query
-- * @i: The format index
-- *
-- * Get the i-th format of the entry.
--
--*
-- * GST_INDEX_ASSOC_VALUE:
-- * @entry: The entry to query
-- * @i: The value index
-- *
-- * Get the i-th value of the entry.
--
type GstIndexAssociation;
--subtype GstIndexAssociation is u_GstIndexAssociation; -- gst/gstindex.h:125
--*
-- * GstIndexAssociation:
-- * @format: the format of the association
-- * @value: the value of the association
-- *
-- * An association in an entry.
--
type GstIndexAssociation is record
format : aliased GStreamer.GST_Low_Level.gstreamer_0_10_gst_gstformat_h.GstFormat; -- gst/gstindex.h:135
value : aliased GLIB.gint64; -- gst/gstindex.h:136
end record;
pragma Convention (C_Pass_By_Copy, GstIndexAssociation); -- gst/gstindex.h:134
--*
-- * GstAssocFlags:
-- * @GST_ASSOCIATION_FLAG_NONE: no extra flags
-- * @GST_ASSOCIATION_FLAG_KEY_UNIT: the entry marks a key unit, a key unit is one
-- * that marks a place where one can randomly seek to.
-- * @GST_ASSOCIATION_FLAG_DELTA_UNIT: the entry marks a delta unit, a delta unit
-- * is one that marks a place where one can relatively seek to.
-- * @GST_ASSOCIATION_FLAG_LAST: extra user defined flags should start here.
-- *
-- * Flags for an association entry.
--
--*
-- * GST_INDEX_FORMAT_FORMAT:
-- * @entry: The entry to query
-- *
-- * Get the format of the format entry
--
--*
-- * GST_INDEX_FORMAT_KEY:
-- * @entry: The entry to query
-- *
-- * Get the key of the format entry
--
--*
-- * GST_INDEX_ID_INVALID:
-- *
-- * Constant for an invalid index id
--
--*
-- * GST_INDEX_ID_DESCRIPTION:
-- * @entry: The entry to query
-- *
-- * Get the description of the id entry
--
--*
-- * GstIndexEntry:
-- *
-- * The basic element of an index.
--
--< private >
type GstIndexEntry is record
c_type : aliased GstIndexEntryType; -- gst/gstindex.h:197
id : aliased GLIB.gint; -- gst/gstindex.h:198
data : aliased anon_222; -- gst/gstindex.h:219
end record;
pragma Convention (C_Pass_By_Copy, GstIndexEntry); -- gst/gstindex.h:195
--*
-- * GstIndexGroup:
-- *
-- * A group of related entries in an index.
--
--< private >
-- unique ID of group in index
type GstIndexGroup is record
groupnum : aliased GLIB.gint; -- gst/gstindex.h:231
entries : access GStreamer.GST_Low_Level.glib_2_0_glib_glist_h.GList; -- gst/gstindex.h:234
certainty : aliased GstIndexCertainty; -- gst/gstindex.h:237
peergroup : aliased GLIB.gint; -- gst/gstindex.h:240
end record;
pragma Convention (C_Pass_By_Copy, GstIndexGroup); -- gst/gstindex.h:228
-- list of entries
-- the certainty level of the group
-- peer group that contains more certain entries
--*
-- * GstIndexFilter:
-- * @index: The index being queried
-- * @entry: The entry to be added.
-- * @user_data: User data passed to the function.
-- *
-- * Function to filter out entries in the index.
-- *
-- * Returns: This function should return %TRUE if the entry is to be added
-- * to the index, %FALSE otherwise.
-- *
--
type GstIndexFilter is access function
(arg1 : access GstIndex;
arg2 : access GstIndexEntry;
arg3 : System.Address) return GLIB.gboolean;
pragma Convention (C, GstIndexFilter); -- gst/gstindex.h:255
--*
-- * GstIndexResolverMethod:
-- * @GST_INDEX_RESOLVER_CUSTOM: Use a custom resolver
-- * @GST_INDEX_RESOLVER_GTYPE: Resolve based on the GType of the object
-- * @GST_INDEX_RESOLVER_PATH: Resolve on the path in graph
-- *
-- * The method used to resolve index writers
--
type GstIndexResolverMethod is
(GST_INDEX_RESOLVER_CUSTOM,
GST_INDEX_RESOLVER_GTYPE,
GST_INDEX_RESOLVER_PATH);
pragma Convention (C, GstIndexResolverMethod); -- gst/gstindex.h:270
--*
-- * GstIndexResolver:
-- * @index: the index being queried.
-- * @writer: The object that wants to write
-- * @writer_string: A description of the writer.
-- * @user_data: user_data as registered
-- *
-- * Function to resolve ids to writer descriptions.
-- *
-- * Returns: %TRUE if an id could be assigned to the writer.
--
type GstIndexResolver is access function
(arg1 : access GstIndex;
arg2 : access GStreamer.GST_Low_Level.gstreamer_0_10_gst_gstobject_h.GstObject;
arg3 : System.Address;
arg4 : System.Address) return GLIB.gboolean;
pragma Convention (C, GstIndexResolver); -- gst/gstindex.h:283
--*
-- * GstIndexFlags:
-- * @GST_INDEX_WRITABLE: The index is writable
-- * @GST_INDEX_READABLE: The index is readable
-- * @GST_INDEX_FLAG_LAST: First flag that can be used by subclasses
-- *
-- * Flags for this index
--
subtype GstIndexFlags is unsigned;
GST_INDEX_WRITABLE : constant GstIndexFlags := 16;
GST_INDEX_READABLE : constant GstIndexFlags := 32;
GST_INDEX_FLAG_LAST : constant GstIndexFlags := 4096; -- gst/gstindex.h:301
--*
-- * GST_INDEX_IS_READABLE:
-- * @obj: The index to check
-- *
-- * Check if the index can be read from
--
--*
-- * GST_INDEX_IS_WRITABLE:
-- * @obj: The index to check
-- *
-- * Check if the index can be written to
--
--*
-- * GstIndex:
-- *
-- * Opaque #GstIndex structure.
--
type GstIndex is record
object : aliased GStreamer.GST_Low_Level.gstreamer_0_10_gst_gstobject_h.GstObject; -- gst/gstindex.h:325
groups : access GStreamer.GST_Low_Level.glib_2_0_glib_glist_h.GList; -- gst/gstindex.h:328
curgroup : access GstIndexGroup; -- gst/gstindex.h:329
maxgroup : aliased GLIB.gint; -- gst/gstindex.h:330
method : aliased GstIndexResolverMethod; -- gst/gstindex.h:332
resolver : GstIndexResolver; -- gst/gstindex.h:333
resolver_user_data : System.Address; -- gst/gstindex.h:334
filter : GstIndexFilter; -- gst/gstindex.h:336
filter_user_data : System.Address; -- gst/gstindex.h:337
filter_user_data_destroy : GStreamer.GST_Low_Level.glib_2_0_glib_gtypes_h.GDestroyNotify; -- gst/gstindex.h:338
writers : System.Address; -- gst/gstindex.h:340
last_id : aliased GLIB.gint; -- gst/gstindex.h:341
resolver_user_data_destroy : GStreamer.GST_Low_Level.glib_2_0_glib_gtypes_h.GDestroyNotify; -- gst/gstindex.h:344
u_gst_reserved : u_GstIndex_u_gst_reserved_array; -- gst/gstindex.h:347
end record;
pragma Convention (C_Pass_By_Copy, GstIndex); -- gst/gstindex.h:324
--< private >
-- ABI added since 0.10.18
--< private >
type GstIndexClass is record
parent_class : aliased GStreamer.GST_Low_Level.gstreamer_0_10_gst_gstobject_h.GstObjectClass; -- gst/gstindex.h:351
get_writer_id : access function
(arg1 : access GstIndex;
arg2 : access GLIB.gint;
arg3 : access GLIB.gchar) return GLIB.gboolean; -- gst/gstindex.h:354
commit : access procedure (arg1 : access GstIndex; arg2 : GLIB.gint); -- gst/gstindex.h:356
add_entry : access procedure (arg1 : access GstIndex; arg2 : access GstIndexEntry); -- gst/gstindex.h:359
get_assoc_entry : access function
(arg1 : access GstIndex;
arg2 : GLIB.gint;
arg3 : GstIndexLookupMethod;
arg4 : GstAssocFlags;
arg5 : GStreamer.GST_Low_Level.gstreamer_0_10_gst_gstformat_h.GstFormat;
arg6 : GLIB.gint64;
arg7 : GStreamer.GST_Low_Level.glib_2_0_glib_gtypes_h.GCompareDataFunc;
arg8 : System.Address) return access GstIndexEntry; -- gst/gstindex.h:365
entry_added : access procedure (arg1 : access GstIndex; arg2 : access GstIndexEntry); -- gst/gstindex.h:367
u_gst_reserved : u_GstIndexClass_u_gst_reserved_array; -- gst/gstindex.h:370
end record;
pragma Convention (C_Pass_By_Copy, GstIndexClass); -- gst/gstindex.h:350
--< protected >
-- abstract methods
-- signals
--< private >
function gst_index_get_type return GLIB.GType; -- gst/gstindex.h:373
pragma Import (C, gst_index_get_type, "gst_index_get_type");
function gst_index_new return access GstIndex; -- gst/gstindex.h:374
pragma Import (C, gst_index_new, "gst_index_new");
procedure gst_index_commit (index : access GstIndex; id : GLIB.gint); -- gst/gstindex.h:375
pragma Import (C, gst_index_commit, "gst_index_commit");
function gst_index_get_group (index : access GstIndex) return GLIB.gint; -- gst/gstindex.h:377
pragma Import (C, gst_index_get_group, "gst_index_get_group");
function gst_index_new_group (index : access GstIndex) return GLIB.gint; -- gst/gstindex.h:378
pragma Import (C, gst_index_new_group, "gst_index_new_group");
function gst_index_set_group (index : access GstIndex; groupnum : GLIB.gint) return GLIB.gboolean; -- gst/gstindex.h:379
pragma Import (C, gst_index_set_group, "gst_index_set_group");
procedure gst_index_set_certainty (index : access GstIndex; certainty : GstIndexCertainty); -- gst/gstindex.h:381
pragma Import (C, gst_index_set_certainty, "gst_index_set_certainty");
function gst_index_get_certainty (index : access GstIndex) return GstIndexCertainty; -- gst/gstindex.h:383
pragma Import (C, gst_index_get_certainty, "gst_index_get_certainty");
procedure gst_index_set_filter
(index : access GstIndex;
filter : GstIndexFilter;
user_data : System.Address); -- gst/gstindex.h:385
pragma Import (C, gst_index_set_filter, "gst_index_set_filter");
procedure gst_index_set_filter_full
(index : access GstIndex;
filter : GstIndexFilter;
user_data : System.Address;
user_data_destroy : GStreamer.GST_Low_Level.glib_2_0_glib_gtypes_h.GDestroyNotify); -- gst/gstindex.h:387
pragma Import (C, gst_index_set_filter_full, "gst_index_set_filter_full");
procedure gst_index_set_resolver
(index : access GstIndex;
resolver : GstIndexResolver;
user_data : System.Address); -- gst/gstindex.h:390
pragma Import (C, gst_index_set_resolver, "gst_index_set_resolver");
procedure gst_index_set_resolver_full
(index : access GstIndex;
resolver : GstIndexResolver;
user_data : System.Address;
user_data_destroy : GStreamer.GST_Low_Level.glib_2_0_glib_gtypes_h.GDestroyNotify); -- gst/gstindex.h:392
pragma Import (C, gst_index_set_resolver_full, "gst_index_set_resolver_full");
function gst_index_get_writer_id
(index : access GstIndex;
writer : access GStreamer.GST_Low_Level.gstreamer_0_10_gst_gstobject_h.GstObject;
id : access GLIB.gint) return GLIB.gboolean; -- gst/gstindex.h:396
pragma Import (C, gst_index_get_writer_id, "gst_index_get_writer_id");
function gst_index_add_format
(index : access GstIndex;
id : GLIB.gint;
format : GStreamer.GST_Low_Level.gstreamer_0_10_gst_gstformat_h.GstFormat) return access GstIndexEntry; -- gst/gstindex.h:398
pragma Import (C, gst_index_add_format, "gst_index_add_format");
function gst_index_add_associationv
(index : access GstIndex;
id : GLIB.gint;
flags : GstAssocFlags;
n : GLIB.gint;
list : access constant GstIndexAssociation) return access GstIndexEntry; -- gst/gstindex.h:399
pragma Import (C, gst_index_add_associationv, "gst_index_add_associationv");
function gst_index_add_association
(index : access GstIndex;
id : GLIB.gint;
flags : GstAssocFlags;
format : GStreamer.GST_Low_Level.gstreamer_0_10_gst_gstformat_h.GstFormat;
value : GLIB.gint64 -- , ...
) return access GstIndexEntry; -- gst/gstindex.h:401
pragma Import (C, gst_index_add_association, "gst_index_add_association");
function gst_index_add_object
(index : access GstIndex;
id : GLIB.gint;
key : access GLIB.gchar;
c_type : GLIB.GType;
object : System.Address) return access GstIndexEntry; -- gst/gstindex.h:403
pragma Import (C, gst_index_add_object, "gst_index_add_object");
function gst_index_add_id
(index : access GstIndex;
id : GLIB.gint;
description : access GLIB.gchar) return access GstIndexEntry; -- gst/gstindex.h:405
pragma Import (C, gst_index_add_id, "gst_index_add_id");
function gst_index_get_assoc_entry
(index : access GstIndex;
id : GLIB.gint;
method : GstIndexLookupMethod;
flags : GstAssocFlags;
format : GStreamer.GST_Low_Level.gstreamer_0_10_gst_gstformat_h.GstFormat;
value : GLIB.gint64) return access GstIndexEntry; -- gst/gstindex.h:408
pragma Import (C, gst_index_get_assoc_entry, "gst_index_get_assoc_entry");
function gst_index_get_assoc_entry_full
(index : access GstIndex;
id : GLIB.gint;
method : GstIndexLookupMethod;
flags : GstAssocFlags;
format : GStreamer.GST_Low_Level.gstreamer_0_10_gst_gstformat_h.GstFormat;
value : GLIB.gint64;
func : GStreamer.GST_Low_Level.glib_2_0_glib_gtypes_h.GCompareDataFunc;
user_data : System.Address) return access GstIndexEntry; -- gst/gstindex.h:411
pragma Import (C, gst_index_get_assoc_entry_full, "gst_index_get_assoc_entry_full");
-- working with index entries
function gst_index_entry_get_type return GLIB.GType; -- gst/gstindex.h:418
pragma Import (C, gst_index_entry_get_type, "gst_index_entry_get_type");
function gst_index_entry_copy (c_entry : access GstIndexEntry) return access GstIndexEntry; -- gst/gstindex.h:419
pragma Import (C, gst_index_entry_copy, "gst_index_entry_copy");
procedure gst_index_entry_free (c_entry : access GstIndexEntry); -- gst/gstindex.h:420
pragma Import (C, gst_index_entry_free, "gst_index_entry_free");
function gst_index_entry_assoc_map
(c_entry : access GstIndexEntry;
format : GStreamer.GST_Low_Level.gstreamer_0_10_gst_gstformat_h.GstFormat;
value : access GLIB.gint64) return GLIB.gboolean; -- gst/gstindex.h:421
pragma Import (C, gst_index_entry_assoc_map, "gst_index_entry_assoc_map");
end GStreamer.GST_Low_Level.gstreamer_0_10_gst_gstindex_h;
| 38.788909 | 132 | 0.697966 |
dcbc298c92de835e1e2585c7f7c5dee0f461079a | 1,989 | ads | Ada | awa/regtests/awa-wikis-parsers-tests.ads | fuzzysloth/ada-awa | f9b921eeea29841667a028f2fc4528e4385d247a | [
"Apache-2.0"
] | null | null | null | awa/regtests/awa-wikis-parsers-tests.ads | fuzzysloth/ada-awa | f9b921eeea29841667a028f2fc4528e4385d247a | [
"Apache-2.0"
] | null | null | null | awa/regtests/awa-wikis-parsers-tests.ads | fuzzysloth/ada-awa | f9b921eeea29841667a028f2fc4528e4385d247a | [
"Apache-2.0"
] | null | null | null | -----------------------------------------------------------------------
-- awa-wikis-parsers-tests -- Unit tests for wiki parsing
-- Copyright (C) 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 Util.Tests;
package AWA.Wikis.Parsers.Tests is
procedure Add_Tests (Suite : in Util.Tests.Access_Test_Suite);
type Test is new Util.Tests.Test with null record;
-- Test bold rendering.
procedure Test_Wiki_Bold (T : in out Test);
-- Test italic rendering.
procedure Test_Wiki_Italic (T : in out Test);
-- Test various format rendering.
procedure Test_Wiki_Formats (T : in out Test);
-- Test heading rendering.
procedure Test_Wiki_Section (T : in out Test);
-- Test list rendering.
procedure Test_Wiki_List (T : in out Test);
-- Test link rendering.
procedure Test_Wiki_Link (T : in out Test);
-- Test quote rendering.
procedure Test_Wiki_Quote (T : in out Test);
-- Test line break rendering.
procedure Test_Wiki_Line_Break (T : in out Test);
-- Test image rendering.
procedure Test_Wiki_Image (T : in out Test);
-- Test preformatted rendering.
procedure Test_Wiki_Preformatted (T : in out Test);
-- Test the text renderer.
procedure Test_Wiki_Text_Renderer (T : in out Test);
end AWA.Wikis.Parsers.Tests;
| 32.606557 | 76 | 0.658622 |
d0d4cf648005e527234aefc807069eb4ec820032 | 14,735 | adb | Ada | samples/client/petstore/ada/src/model/samples-petstore-models.adb | okapon/swagger-codegen | d9c4e014e6791072b1c71faa4a77098f9bdcc3a4 | [
"Apache-2.0"
] | 1 | 2019-01-02T10:32:07.000Z | 2019-01-02T10:32:07.000Z | samples/client/petstore/ada/src/model/samples-petstore-models.adb | okapon/swagger-codegen | d9c4e014e6791072b1c71faa4a77098f9bdcc3a4 | [
"Apache-2.0"
] | 1 | 2021-06-23T21:23:07.000Z | 2021-06-23T21:23:07.000Z | samples/client/petstore/ada/src/model/samples-petstore-models.adb | okapon/swagger-codegen | d9c4e014e6791072b1c71faa4a77098f9bdcc3a4 | [
"Apache-2.0"
] | 2 | 2019-02-19T23:16:32.000Z | 2020-07-01T14:13:01.000Z | -- Swagger Petstore
-- This is a sample server Petstore server. You can find out more about Swagger at [http://swagger.io](http://swagger.io) or on [irc.freenode.net, #swagger](http://swagger.io/irc/). For this sample, you can use the api key `special_key` to test the authorization filters.
--
-- OpenAPI spec version: 1.0.0
-- Contact: [email protected]
--
-- NOTE: This package is auto generated by the swagger code generator 2.4.0-SNAPSHOT.
-- https://github.com/swagger-api/swagger-codegen.git
-- Do not edit the class manually.
package body Samples.Petstore.Models is
use Swagger.Streams;
procedure Serialize (Into : in out Swagger.Streams.Output_Stream'Class;
Name : in String;
Value : in Currency_Type) is
begin
Into.Start_Entity (Name);
Into.End_Entity (Name);
end Serialize;
procedure Serialize (Into : in out Swagger.Streams.Output_Stream'Class;
Name : in String;
Value : in Currency_Type_Vectors.Vector) is
begin
Into.Start_Array (Name);
for Item of Value loop
Serialize (Into, "", Item);
end loop;
Into.End_Array (Name);
end Serialize;
procedure Deserialize (From : in Swagger.Value_Type;
Name : in String;
Value : out Currency_Type) is
Object : Swagger.Value_Type;
begin
Swagger.Streams.Deserialize (From, Name, Object);
end Deserialize;
procedure Deserialize (From : in Swagger.Value_Type;
Name : in String;
Value : out Currency_Type_Vectors.Vector) is
List : Swagger.Value_Array_Type;
Item : Currency_Type;
begin
Value.Clear;
Swagger.Streams.Deserialize (From, Name, List);
for Data of List loop
Deserialize (Data, "", Item);
Value.Append (Item);
end loop;
end Deserialize;
procedure Serialize (Into : in out Swagger.Streams.Output_Stream'Class;
Name : in String;
Value : in Amount_Type) is
begin
Into.Start_Entity (Name);
Into.Write_Entity ("value", Value.Value);
Serialize (Into, "currency", Value.Currency);
Into.End_Entity (Name);
end Serialize;
procedure Serialize (Into : in out Swagger.Streams.Output_Stream'Class;
Name : in String;
Value : in Amount_Type_Vectors.Vector) is
begin
Into.Start_Array (Name);
for Item of Value loop
Serialize (Into, "", Item);
end loop;
Into.End_Array (Name);
end Serialize;
procedure Deserialize (From : in Swagger.Value_Type;
Name : in String;
Value : out Amount_Type) is
Object : Swagger.Value_Type;
begin
Swagger.Streams.Deserialize (From, Name, Object);
Swagger.Streams.Deserialize (Object, "value", Value.Value);
Deserialize (Object, "currency", Value.Currency);
end Deserialize;
procedure Deserialize (From : in Swagger.Value_Type;
Name : in String;
Value : out Amount_Type_Vectors.Vector) is
List : Swagger.Value_Array_Type;
Item : Amount_Type;
begin
Value.Clear;
Swagger.Streams.Deserialize (From, Name, List);
for Data of List loop
Deserialize (Data, "", Item);
Value.Append (Item);
end loop;
end Deserialize;
procedure Serialize (Into : in out Swagger.Streams.Output_Stream'Class;
Name : in String;
Value : in ApiResponse_Type) is
begin
Into.Start_Entity (Name);
Into.Write_Entity ("code", Value.Code);
Into.Write_Entity ("type", Value.P_Type);
Into.Write_Entity ("message", Value.Message);
Into.End_Entity (Name);
end Serialize;
procedure Serialize (Into : in out Swagger.Streams.Output_Stream'Class;
Name : in String;
Value : in ApiResponse_Type_Vectors.Vector) is
begin
Into.Start_Array (Name);
for Item of Value loop
Serialize (Into, "", Item);
end loop;
Into.End_Array (Name);
end Serialize;
procedure Deserialize (From : in Swagger.Value_Type;
Name : in String;
Value : out ApiResponse_Type) is
Object : Swagger.Value_Type;
begin
Swagger.Streams.Deserialize (From, Name, Object);
Swagger.Streams.Deserialize (Object, "code", Value.Code);
Swagger.Streams.Deserialize (Object, "type", Value.P_Type);
Swagger.Streams.Deserialize (Object, "message", Value.Message);
end Deserialize;
procedure Deserialize (From : in Swagger.Value_Type;
Name : in String;
Value : out ApiResponse_Type_Vectors.Vector) is
List : Swagger.Value_Array_Type;
Item : ApiResponse_Type;
begin
Value.Clear;
Swagger.Streams.Deserialize (From, Name, List);
for Data of List loop
Deserialize (Data, "", Item);
Value.Append (Item);
end loop;
end Deserialize;
procedure Serialize (Into : in out Swagger.Streams.Output_Stream'Class;
Name : in String;
Value : in Tag_Type) is
begin
Into.Start_Entity (Name);
Serialize (Into, "id", Value.Id);
Into.Write_Entity ("name", Value.Name);
Into.End_Entity (Name);
end Serialize;
procedure Serialize (Into : in out Swagger.Streams.Output_Stream'Class;
Name : in String;
Value : in Tag_Type_Vectors.Vector) is
begin
Into.Start_Array (Name);
for Item of Value loop
Serialize (Into, "", Item);
end loop;
Into.End_Array (Name);
end Serialize;
procedure Deserialize (From : in Swagger.Value_Type;
Name : in String;
Value : out Tag_Type) is
Object : Swagger.Value_Type;
begin
Swagger.Streams.Deserialize (From, Name, Object);
Swagger.Streams.Deserialize (Object, "id", Value.Id);
Swagger.Streams.Deserialize (Object, "name", Value.Name);
end Deserialize;
procedure Deserialize (From : in Swagger.Value_Type;
Name : in String;
Value : out Tag_Type_Vectors.Vector) is
List : Swagger.Value_Array_Type;
Item : Tag_Type;
begin
Value.Clear;
Swagger.Streams.Deserialize (From, Name, List);
for Data of List loop
Deserialize (Data, "", Item);
Value.Append (Item);
end loop;
end Deserialize;
procedure Serialize (Into : in out Swagger.Streams.Output_Stream'Class;
Name : in String;
Value : in Category_Type) is
begin
Into.Start_Entity (Name);
Serialize (Into, "id", Value.Id);
Into.Write_Entity ("name", Value.Name);
Into.End_Entity (Name);
end Serialize;
procedure Serialize (Into : in out Swagger.Streams.Output_Stream'Class;
Name : in String;
Value : in Category_Type_Vectors.Vector) is
begin
Into.Start_Array (Name);
for Item of Value loop
Serialize (Into, "", Item);
end loop;
Into.End_Array (Name);
end Serialize;
procedure Deserialize (From : in Swagger.Value_Type;
Name : in String;
Value : out Category_Type) is
Object : Swagger.Value_Type;
begin
Swagger.Streams.Deserialize (From, Name, Object);
Swagger.Streams.Deserialize (Object, "id", Value.Id);
Swagger.Streams.Deserialize (Object, "name", Value.Name);
end Deserialize;
procedure Deserialize (From : in Swagger.Value_Type;
Name : in String;
Value : out Category_Type_Vectors.Vector) is
List : Swagger.Value_Array_Type;
Item : Category_Type;
begin
Value.Clear;
Swagger.Streams.Deserialize (From, Name, List);
for Data of List loop
Deserialize (Data, "", Item);
Value.Append (Item);
end loop;
end Deserialize;
procedure Serialize (Into : in out Swagger.Streams.Output_Stream'Class;
Name : in String;
Value : in Pet_Type) is
begin
Into.Start_Entity (Name);
Serialize (Into, "id", Value.Id);
Serialize (Into, "category", Value.Category);
Into.Write_Entity ("name", Value.Name);
Serialize (Into, "photoUrls", Value.Photo_Urls);
Serialize (Into, "tags", Value.Tags);
Into.Write_Entity ("status", Value.Status);
Into.End_Entity (Name);
end Serialize;
procedure Serialize (Into : in out Swagger.Streams.Output_Stream'Class;
Name : in String;
Value : in Pet_Type_Vectors.Vector) is
begin
Into.Start_Array (Name);
for Item of Value loop
Serialize (Into, "", Item);
end loop;
Into.End_Array (Name);
end Serialize;
procedure Deserialize (From : in Swagger.Value_Type;
Name : in String;
Value : out Pet_Type) is
Object : Swagger.Value_Type;
begin
Swagger.Streams.Deserialize (From, Name, Object);
Swagger.Streams.Deserialize (Object, "id", Value.Id);
Deserialize (Object, "category", Value.Category);
Swagger.Streams.Deserialize (Object, "name", Value.Name);
Swagger.Streams.Deserialize (Object, "photoUrls", Value.Photo_Urls);
Deserialize (Object, "tags", Value.Tags);
Swagger.Streams.Deserialize (Object, "status", Value.Status);
end Deserialize;
procedure Deserialize (From : in Swagger.Value_Type;
Name : in String;
Value : out Pet_Type_Vectors.Vector) is
List : Swagger.Value_Array_Type;
Item : Pet_Type;
begin
Value.Clear;
Swagger.Streams.Deserialize (From, Name, List);
for Data of List loop
Deserialize (Data, "", Item);
Value.Append (Item);
end loop;
end Deserialize;
procedure Serialize (Into : in out Swagger.Streams.Output_Stream'Class;
Name : in String;
Value : in User_Type) is
begin
Into.Start_Entity (Name);
Serialize (Into, "id", Value.Id);
Into.Write_Entity ("username", Value.Username);
Into.Write_Entity ("firstName", Value.First_Name);
Into.Write_Entity ("lastName", Value.Last_Name);
Into.Write_Entity ("email", Value.Email);
Into.Write_Entity ("password", Value.Password);
Into.Write_Entity ("phone", Value.Phone);
Into.Write_Entity ("userStatus", Value.User_Status);
Into.End_Entity (Name);
end Serialize;
procedure Serialize (Into : in out Swagger.Streams.Output_Stream'Class;
Name : in String;
Value : in User_Type_Vectors.Vector) is
begin
Into.Start_Array (Name);
for Item of Value loop
Serialize (Into, "", Item);
end loop;
Into.End_Array (Name);
end Serialize;
procedure Deserialize (From : in Swagger.Value_Type;
Name : in String;
Value : out User_Type) is
Object : Swagger.Value_Type;
begin
Swagger.Streams.Deserialize (From, Name, Object);
Swagger.Streams.Deserialize (Object, "id", Value.Id);
Swagger.Streams.Deserialize (Object, "username", Value.Username);
Swagger.Streams.Deserialize (Object, "firstName", Value.First_Name);
Swagger.Streams.Deserialize (Object, "lastName", Value.Last_Name);
Swagger.Streams.Deserialize (Object, "email", Value.Email);
Swagger.Streams.Deserialize (Object, "password", Value.Password);
Swagger.Streams.Deserialize (Object, "phone", Value.Phone);
Swagger.Streams.Deserialize (Object, "userStatus", Value.User_Status);
end Deserialize;
procedure Deserialize (From : in Swagger.Value_Type;
Name : in String;
Value : out User_Type_Vectors.Vector) is
List : Swagger.Value_Array_Type;
Item : User_Type;
begin
Value.Clear;
Swagger.Streams.Deserialize (From, Name, List);
for Data of List loop
Deserialize (Data, "", Item);
Value.Append (Item);
end loop;
end Deserialize;
procedure Serialize (Into : in out Swagger.Streams.Output_Stream'Class;
Name : in String;
Value : in Order_Type) is
begin
Into.Start_Entity (Name);
Serialize (Into, "id", Value.Id);
Serialize (Into, "petId", Value.Pet_Id);
Into.Write_Entity ("quantity", Value.Quantity);
Into.Write_Entity ("shipDate", Value.Ship_Date);
Into.Write_Entity ("status", Value.Status);
Into.Write_Entity ("complete", Value.Complete);
Into.End_Entity (Name);
end Serialize;
procedure Serialize (Into : in out Swagger.Streams.Output_Stream'Class;
Name : in String;
Value : in Order_Type_Vectors.Vector) is
begin
Into.Start_Array (Name);
for Item of Value loop
Serialize (Into, "", Item);
end loop;
Into.End_Array (Name);
end Serialize;
procedure Deserialize (From : in Swagger.Value_Type;
Name : in String;
Value : out Order_Type) is
Object : Swagger.Value_Type;
begin
Swagger.Streams.Deserialize (From, Name, Object);
Swagger.Streams.Deserialize (Object, "id", Value.Id);
Swagger.Streams.Deserialize (Object, "petId", Value.Pet_Id);
Swagger.Streams.Deserialize (Object, "quantity", Value.Quantity);
Deserialize (Object, "shipDate", Value.Ship_Date);
Swagger.Streams.Deserialize (Object, "status", Value.Status);
Swagger.Streams.Deserialize (Object, "complete", Value.Complete);
end Deserialize;
procedure Deserialize (From : in Swagger.Value_Type;
Name : in String;
Value : out Order_Type_Vectors.Vector) is
List : Swagger.Value_Array_Type;
Item : Order_Type;
begin
Value.Clear;
Swagger.Streams.Deserialize (From, Name, List);
for Data of List loop
Deserialize (Data, "", Item);
Value.Append (Item);
end loop;
end Deserialize;
end Samples.Petstore.Models;
| 34.508197 | 274 | 0.596064 |
1863b4738fa4201f176de37421a5b5d77820f73b | 18,798 | adb | Ada | source/xml/sax/xml-sax-input_sources-streams.adb | svn2github/matreshka | 9d222b3ad9da508855fb1f5adbe5e8a4fad4c530 | [
"BSD-3-Clause"
] | 24 | 2016-11-29T06:59:41.000Z | 2021-08-30T11:55:16.000Z | source/xml/sax/xml-sax-input_sources-streams.adb | svn2github/matreshka | 9d222b3ad9da508855fb1f5adbe5e8a4fad4c530 | [
"BSD-3-Clause"
] | 2 | 2019-01-16T05:15:20.000Z | 2019-02-03T10:03:32.000Z | source/xml/sax/xml-sax-input_sources-streams.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-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$
------------------------------------------------------------------------------
package body XML.SAX.Input_Sources.Streams is
procedure Free is
new Ada.Unchecked_Deallocation
(Matreshka.Internals.Text_Codecs.Abstract_Decoder'Class,
Matreshka.Internals.Text_Codecs.Decoder_Access);
-- not overriding function Encoding
-- (Self : SAX_Input_Source) return League.Strings.Universal_String;
--------------
-- Finalize --
--------------
overriding procedure Finalize (Self : in out Stream_Input_Source) is
begin
Free (Self.Buffer);
Free (Self.Decoder);
end Finalize;
----------
-- Next --
----------
overriding procedure Next
(Self : in out Stream_Input_Source;
Buffer : in out
not null Matreshka.Internals.Strings.Shared_String_Access;
End_Of_Data : out Boolean)
is
use type Ada.Streams.Stream_Element;
use type Matreshka.Internals.Text_Codecs.Decoder_Access;
type Encodings is
(Unknown,
UCS4LE,
UCS4BE,
UCS42143,
UCS43412,
UTF16LE,
UTF16BE,
EBCDIC,
UTF8);
First : Ada.Streams.Stream_Element_Offset := Self.Last + 1;
Encoding : Encodings := Unknown;
Factory : Matreshka.Internals.Text_Codecs.Decoder_Factory;
begin
-- Restart decoding when requested.
if Self.Restart then
Self.Restart := False;
Self.Decoder.Decode_Append
(Self.Buffer (Self.First .. Self.Last), Buffer);
end if;
-- Reallocate buffer when necessary.
if First > Self.Buffer'Last then
declare
Old : Stream_Element_Array_Access := Self.Buffer;
begin
Self.Buffer :=
new Ada.Streams.Stream_Element_Array
(Old'First .. Old'Last + 1024);
Self.Buffer (Old'Range) := Old.all;
Free (Old);
end;
end if;
-- Read next portion of data from the source.
Stream_Input_Source'Class (Self).Read
(Self.Buffer (First .. Self.Buffer'Last), Self.Last, End_Of_Data);
-- Detect encoding automatically when four first bytes are readed.
if Self.Decoder = null then
if Self.Last >= 3 then
First := 0;
-- Try to recognize Byte Order Mark.
if Self.Buffer (0) = 16#00#
and Self.Buffer (1) = 16#00#
and Self.Buffer (2) = 16#FE#
and Self.Buffer (3) = 16#FF#
then
-- UCS-4, big-endian machine (1234 order)
Encoding := UCS4BE;
First := 4;
elsif Self.Buffer (0) = 16#FF#
and Self.Buffer (1) = 16#FE#
and Self.Buffer (2) = 16#00#
and Self.Buffer (3) = 16#00#
then
-- UCS-4, little-endian machine (4321 order)
Encoding := UCS4LE;
First := 4;
elsif Self.Buffer (0) = 16#00#
and Self.Buffer (1) = 16#00#
and Self.Buffer (2) = 16#FF#
and Self.Buffer (3) = 16#FE#
then
-- UCS-4, unusual octet order (2143)
Encoding := UCS42143;
First := 4;
elsif Self.Buffer (0) = 16#FE#
and Self.Buffer (1) = 16#FF#
and Self.Buffer (2) = 16#00#
and Self.Buffer (3) = 16#00#
then
-- UCS-4, unusual octet order (3412)
Encoding := UCS43412;
First := 4;
elsif Self.Buffer (0) = 16#FE#
and Self.Buffer (1) = 16#FF#
and (Self.Buffer (2) /= 16#00#
or Self.Buffer (3) /= 16#00#)
then
-- UTF-16, big-endian
Encoding := UTF16BE;
First := 2;
elsif Self.Buffer (0) = 16#FF#
and Self.Buffer (1) = 16#FE#
and (Self.Buffer (2) /= 16#00#
or Self.Buffer (3) /= 16#00#)
then
-- UTF-16, little-endian
Encoding := UTF16LE;
First := 2;
elsif Self.Buffer (0) = 16#EF#
and Self.Buffer (1) = 16#BB#
and Self.Buffer (2) = 16#BF#
then
-- UTF-8
Encoding := UTF8;
First := 3;
-- Byte Order Mark is not recognized, try to detect encoding
-- without Byte Order Mark.
elsif Self.Buffer (0) = 16#00#
and Self.Buffer (1) = 16#00#
and Self.Buffer (2) = 16#00#
and Self.Buffer (3) = 16#3C#
then
-- UCS-4 or other encoding with a 32-bit code unit and ASCII
-- characters encoded as ASCII values, big-endian (1234).
Encoding := UCS4BE;
elsif Self.Buffer (0) = 16#3C#
and Self.Buffer (1) = 16#00#
and Self.Buffer (2) = 16#00#
and Self.Buffer (3) = 16#00#
then
-- UCS-4 or other encoding with a 32-bit code unit and ASCII
-- characters encoded as ASCII values, little-endian (4321).
Encoding := UCS4LE;
elsif Self.Buffer (0) = 16#00#
and Self.Buffer (1) = 16#00#
and Self.Buffer (2) = 16#3C#
and Self.Buffer (3) = 16#00#
then
-- UCS-4 or other encoding with a 32-bit code unit and ASCII
-- characters encoded as ASCII values, unusual byte order
-- (2143).
Encoding := UCS42143;
elsif Self.Buffer (0) = 16#00#
and Self.Buffer (1) = 16#3C#
and Self.Buffer (2) = 16#00#
and Self.Buffer (3) = 16#00#
then
-- UCS-4 or other encoding with a 32-bit code unit and ASCII
-- characters encoded as ASCII values, unusual byte order
-- (3412).
Encoding := UCS43412;
elsif Self.Buffer (0) = 16#00#
and Self.Buffer (1) = 16#3C#
and Self.Buffer (2) = 16#00#
and Self.Buffer (3) = 16#3F#
then
-- UTF-16BE or big-endian ISO-10646-UCS-2 or other encoding
-- with a 16-bit code unit in big-endian order and ASCII
-- characters encoded as ASCII values.
Encoding := UTF16BE;
elsif Self.Buffer (0) = 16#3C#
and Self.Buffer (1) = 16#00#
and Self.Buffer (2) = 16#3F#
and Self.Buffer (3) = 16#00#
then
-- UTF-16LE or little-endian ISO-10646-UCS-2 or other encoding
-- with a 16-bit code unit in little-endian order and ASCII
-- characters encoded as ASCII values.
Encoding := UTF16LE;
elsif Self.Buffer (0) = 16#3C#
and Self.Buffer (1) = 16#3F#
and Self.Buffer (2) = 16#78#
and Self.Buffer (3) = 16#6D#
then
-- UTF-8, ISO 646, ASCII, some part of ISO 8859, Shift-JIS,
-- EUC, or any other 7-bit, 8-bit, or mixed-width encoding
-- which ensures that the characters of ASCII have their normal
-- positions, width, and values.
Encoding := UTF8;
elsif Self.Buffer (0) = 16#4C#
and Self.Buffer (1) = 16#6F#
and Self.Buffer (2) = 16#A7#
and Self.Buffer (3) = 16#94#
then
-- EBCDIC (in some flavor).
Encoding := EBCDIC;
else
-- UTF-8 without an encoding declaration, or else the data
-- stream is mislabeled (lacking a required encoding
-- declaration), corrupt, fragmentary, or enclosed in a wrapper
-- of some kind.
Encoding := UTF8;
end if;
elsif End_Of_Data then
-- This is just a guess, entity is too small to detect encoding
-- more precisely.
First := 0;
Encoding := UTF8;
end if;
if Encoding /= Unknown then
-- Create appropriate decoder.
case Encoding is
when Unknown =>
raise Program_Error;
when UCS4LE =>
raise Program_Error;
when UCS4BE =>
raise Program_Error;
when UCS42143 =>
raise Program_Error;
when UCS43412 =>
raise Program_Error;
when UTF16LE =>
Self.Encoding :=
League.Strings.To_Universal_String ("UTF-16");
Factory :=
Matreshka.Internals.Text_Codecs.Decoder
(Matreshka.Internals.Text_Codecs.MIB_UTF16LE);
when UTF16BE =>
Self.Encoding :=
League.Strings.To_Universal_String ("UTF-16");
Factory :=
Matreshka.Internals.Text_Codecs.Decoder
(Matreshka.Internals.Text_Codecs.MIB_UTF16BE);
when EBCDIC =>
raise Program_Error;
when UTF8 =>
Self.Encoding :=
League.Strings.To_Universal_String ("UTF-8");
Factory :=
Matreshka.Internals.Text_Codecs.Decoder
(Matreshka.Internals.Text_Codecs.MIB_UTF8);
end case;
-- Create decoder's state object.
Self.Decoder :=
new Matreshka.Internals.Text_Codecs.Abstract_Decoder'Class'
(Factory (Self.Version_Mode));
-- Decode all readed data (not last chunk only) except possible
-- leading byte order mark, but protect from decoding empty
-- sequence of bytes.
if First <= Self.Last then
Self.Decoder.Decode_Append
(Self.Buffer (First .. Self.Last), Buffer);
end if;
Self.First := First;
end if;
-- Decode received portion of data.
elsif Self.Last >= First then
Self.Decoder.Decode_Append
(Self.Buffer (First .. Self.Last), Buffer);
if not Self.Accumulate then
Self.Last := -1;
else
Self.First := Self.Last + 1;
end if;
end if;
end Next;
---------------
-- Public_Id --
---------------
overriding function Public_Id
(Self : Stream_Input_Source) return League.Strings.Universal_String is
begin
return Self.Public_Id;
end Public_Id;
-- not overriding procedure Set_Encoding
-- (Self : in out SAX_Input_Source;
-- Encoding : League.Strings.Universal_String);
----------
-- Read --
----------
not overriding procedure Read
(Self : in out Stream_Input_Source;
Buffer : out Ada.Streams.Stream_Element_Array;
Last : out Ada.Streams.Stream_Element_Offset;
End_Of_Data : out Boolean) is
begin
Self.Stream.Read (Buffer, Last);
if Last < Buffer'First then
Last := Buffer'First - 1;
End_Of_Data := True;
else
End_Of_Data := False;
end if;
end Read;
-----------
-- Reset --
-----------
not overriding procedure Reset (Self : in out Stream_Input_Source) is
begin
Self.First := 0;
Self.Last := -1;
Self.Accumulate := True;
Self.Restart := False;
Self.Decoder := null;
Self.Stream := null;
Self.Version_Mode := Matreshka.Internals.Text_Codecs.XML_1_0;
Free (Self.Decoder);
end Reset;
-----------
-- Reset --
-----------
overriding procedure Reset
(Self : in out Stream_Input_Source;
Version : League.Strings.Universal_String;
Encoding : League.Strings.Universal_String;
Rescan : out Boolean;
Success : out Boolean)
is
use type Matreshka.Internals.Text_Codecs.Decoder_Factory;
use type Matreshka.Internals.Text_Codecs.Decoder_Mode;
use type League.Strings.Universal_String;
Old_Version_Mode : constant Matreshka.Internals.Text_Codecs.Decoder_Mode
:= Self.Version_Mode;
Old_Encoding : constant League.Strings.Universal_String
:= Self.Encoding;
Factory : Matreshka.Internals.Text_Codecs.Decoder_Factory;
begin
Self.Accumulate := False;
if not Version.Is_Empty then
Self.Set_Version (Version);
end if;
if not Encoding.Is_Empty then
Self.Set_Encoding (Encoding);
end if;
Rescan :=
Self.Version_Mode /= Old_Version_Mode
or Self.Encoding /= Old_Encoding;
Success := True;
if Rescan then
-- Release decoder object.
Free (Self.Decoder);
-- Resolve new decoder and create its state.
Factory :=
Matreshka.Internals.Text_Codecs.Decoder
(Matreshka.Internals.Text_Codecs.To_Character_Set (Self.Encoding));
if Factory = null then
Success := False;
else
Self.Decoder :=
new Matreshka.Internals.Text_Codecs.Abstract_Decoder'Class'
(Factory (Self.Version_Mode));
end if;
Self.Restart := True;
end if;
end Reset;
------------------
-- Set_Encoding --
------------------
not overriding procedure Set_Encoding
(Self : in out Stream_Input_Source;
Encoding : League.Strings.Universal_String) is
begin
Self.Encoding := Encoding;
end Set_Encoding;
-------------------
-- Set_Public_Id --
-------------------
not overriding procedure Set_Public_Id
(Self : in out Stream_Input_Source;
Id : League.Strings.Universal_String) is
begin
Self.Public_Id := Id;
end Set_Public_Id;
----------------
-- Set_Stream --
----------------
not overriding procedure Set_Stream
(Self : in out Stream_Input_Source;
Stream : not null Stream_Access) is
begin
Self.Stream := Stream;
end Set_Stream;
-------------------
-- Set_System_Id --
-------------------
overriding procedure Set_System_Id
(Self : in out Stream_Input_Source;
Id : League.Strings.Universal_String) is
begin
Self.System_Id := Id;
end Set_System_Id;
-----------------
-- Set_Version --
-----------------
overriding procedure Set_Version
(Self : in out Stream_Input_Source;
Version : League.Strings.Universal_String)
is
use League.Strings;
begin
if Version = To_Universal_String ("1.0") then
Self.Version_Mode := Matreshka.Internals.Text_Codecs.XML_1_0;
elsif Version = To_Universal_String ("1.1") then
Self.Version_Mode := Matreshka.Internals.Text_Codecs.XML_1_1;
else
raise Constraint_Error with "unsupported XML version";
end if;
end Set_Version;
---------------
-- System_Id --
---------------
overriding function System_Id
(Self : Stream_Input_Source) return League.Strings.Universal_String is
begin
return Self.System_Id;
end System_Id;
end XML.SAX.Input_Sources.Streams;
| 32.978947 | 79 | 0.496223 |
1889a54656eac005fd856f84d8a3496b03d2f02d | 2,423 | adb | Ada | src/util/spat-stop_watch.adb | HeisenbugLtd/spat | c3ec2b7675a12bdbe5378862b1ec6b17805d5a6c | [
"WTFPL"
] | 20 | 2020-05-17T18:55:16.000Z | 2021-05-26T14:53:53.000Z | src/util/spat-stop_watch.adb | selroc/spat | c3ec2b7675a12bdbe5378862b1ec6b17805d5a6c | [
"WTFPL"
] | 33 | 2020-04-03T13:08:50.000Z | 2020-10-17T04:26:34.000Z | src/util/spat-stop_watch.adb | selroc/spat | c3ec2b7675a12bdbe5378862b1ec6b17805d5a6c | [
"WTFPL"
] | 4 | 2020-06-12T12:17:27.000Z | 2021-09-09T14:19:31.000Z | ------------------------------------------------------------------------------
-- Copyright (C) 2020 by Heisenbug Ltd. ([email protected])
--
-- This work is free. You can redistribute it and/or modify it under the
-- terms of the Do What The Fuck You Want To Public License, Version 2,
-- as published by Sam Hocevar. See the LICENSE file for more details.
------------------------------------------------------------------------------
pragma License (Unrestricted);
package body SPAT.Stop_Watch is
use type Ada.Real_Time.Time;
---------------------------------------------------------------------------
-- Image
---------------------------------------------------------------------------
function Image (TS : in Ada.Real_Time.Time_Span) return String is
(Image (Value => Ada.Real_Time.To_Duration (TS => TS)));
---------------------------------------------------------------------------
-- Create
---------------------------------------------------------------------------
function Create return T is
begin
return Result : T do
Result.Reset;
end return;
end Create;
---------------------------------------------------------------------------
-- Elapsed
---------------------------------------------------------------------------
function Elapsed (This : in T) return String is
(Image (TS => Ada.Real_Time.Clock - This.Lap_Time));
---------------------------------------------------------------------------
-- Elapsed_Total
---------------------------------------------------------------------------
function Elapsed_Total (This : in T) return String is
(Image (TS => Ada.Real_Time.Clock - This.Start_Time));
---------------------------------------------------------------------------
-- Reset
---------------------------------------------------------------------------
procedure Reset (This : in out T) is
Now : constant Ada.Real_Time.Time := Ada.Real_Time.Clock;
begin
This.Start_Time := Now;
This.Lap_Time := Now;
end Reset;
---------------------------------------------------------------------------
-- Start
--
-- Starts a new lap measurement.
---------------------------------------------------------------------------
procedure Start (This : in out T) is
begin
This.Lap_Time := Ada.Real_Time.Clock;
end Start;
end SPAT.Stop_Watch;
| 38.460317 | 78 | 0.354932 |
0eca45db9aef79acd78ee92f4c2727ce5e604826 | 4,991 | ads | Ada | tools-src/gnu/gcc/gcc/ada/s-valdec.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/s-valdec.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/s-valdec.ads | modern-tomato/tomato | 96f09fab4929c6ddde5c9113f1b2476ad37133c4 | [
"FSFAP"
] | 69 | 2015-01-02T10:45:56.000Z | 2021-09-06T07:52:13.000Z | ------------------------------------------------------------------------------
-- --
-- GNAT COMPILER COMPONENTS --
-- --
-- S Y S T E M . V A L _ D E C --
-- --
-- S p e c --
-- --
-- $Revision$
-- --
-- Copyright (C) 1992,1993,1994,1995,1996 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 routines for scanning decimal values where the size
-- of the type is no greater than Standard.Integer'Size, for use in Text_IO.
-- Decimal_IO, and the Value attribute for such decimal types.
package System.Val_Dec is
pragma Pure (Val_Dec);
function Scan_Decimal
(Str : String;
Ptr : access Integer;
Max : Integer;
Scale : Integer)
return Integer;
-- 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
-- Integer'Integer_Value (decimal-literal-value), using the given Scale
-- 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_Decimal (Str : String; Scale : Integer) return Integer;
-- Used in computing X'Value (Str) where X is a decimal types whose size
-- does not exceed Standard.Integer'Size. 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, otherwise the value returned is the
-- value Integer'Integer_Value (decimal-literal-value), using the given
-- Scale to determine this value.
end System.Val_Dec;
| 58.717647 | 79 | 0.537167 |
204144c32bbf6c2c9ae335c94011b15c48eaa524 | 7,734 | adb | Ada | tests/ada_wellknown.adb | reznikmm/ada_lsp | b0e2666f758d6e46b973b5d7e4b9a7ba66c46157 | [
"MIT"
] | 11 | 2017-10-18T18:22:04.000Z | 2022-01-01T12:22:23.000Z | tests/ada_wellknown.adb | reznikmm/ada_lsp | b0e2666f758d6e46b973b5d7e4b9a7ba66c46157 | [
"MIT"
] | null | null | null | tests/ada_wellknown.adb | reznikmm/ada_lsp | b0e2666f758d6e46b973b5d7e4b9a7ba66c46157 | [
"MIT"
] | 1 | 2019-09-14T23:13:33.000Z | 2019-09-14T23:13:33.000Z | -- Copyright (c) 2017 Maxim Reznik <[email protected]>
--
-- SPDX-License-Identifier: MIT
-- License-Filename: LICENSE
-------------------------------------------------------------
with Ada.Streams.Stream_IO;
with Ada.Containers.Hashed_Maps;
with League.JSON.Arrays;
with League.JSON.Documents;
with League.JSON.Objects;
with League.JSON.Values;
with League.Stream_Element_Vectors;
with League.String_Vectors;
with League.Strings.Hash;
package body Ada_Wellknown is
function "+" (Text : Wide_Wide_String)
return League.Strings.Universal_String renames
League.Strings.To_Universal_String;
function Read_File (Name : String)
return League.Stream_Element_Vectors.Stream_Element_Vector;
package MarkedString_Maps is new Ada.Containers.Hashed_Maps
(Key_Type => League.Strings.Universal_String,
Element_Type => LSP.Messages.MarkedString_Vectors.Vector,
Hash => League.Strings.Hash,
Equivalent_Keys => League.Strings."=",
"=" => LSP.Messages.MarkedString_Vectors."=");
package SignatureInformation_Maps is new Ada.Containers.Hashed_Maps
(Key_Type => League.Strings.Universal_String,
Element_Type => LSP.Messages.SignatureInformation,
Hash => League.Strings.Hash,
Equivalent_Keys => League.Strings."=",
"=" => LSP.Messages."=");
MarkedString_Map : MarkedString_Maps.Map;
Signatures : SignatureInformation_Maps.Map;
Attr : LSP.Messages.CompletionItem_Vectors.Vector;
---------------------
-- Attribute_Hover --
---------------------
function Attribute_Hover
(Name : LSP.Types.LSP_String)
return LSP.Messages.MarkedString_Vectors.Vector
is
Cursor : constant MarkedString_Maps.Cursor :=
MarkedString_Map.Find (Name.To_Lowercase);
begin
if MarkedString_Maps.Has_Element (Cursor) then
return MarkedString_Maps.Element (Cursor);
else
return LSP.Messages.MarkedString_Vectors.Empty_Vector;
end if;
end Attribute_Hover;
----------------
-- Attributes --
----------------
function Attributes return LSP.Messages.CompletionItem_Vectors.Vector is
begin
return Attr;
end Attributes;
----------------
-- Initialize --
----------------
procedure Initialize is
JSON : constant League.JSON.Documents.JSON_Document :=
League.JSON.Documents.From_JSON (Read_File ("tests/wellknown.json"));
Attr_List : constant League.JSON.Arrays.JSON_Array :=
JSON.To_JSON_Object.Value (+"Attributes").To_Array;
Hover : constant League.JSON.Objects.JSON_Object :=
JSON.To_JSON_Object.Value (+"Hover").To_Object;
Hover_Keys : constant League.String_Vectors.Universal_String_Vector :=
Hover.Keys;
Sign : constant League.JSON.Objects.JSON_Object :=
JSON.To_JSON_Object.Value (+"Signatures").To_Object;
Sign_Keys : constant League.String_Vectors.Universal_String_Vector :=
Sign.Keys;
begin
for J in 1 .. Attr_List.Length loop
declare
function "-" (Name : Wide_Wide_String) return LSP.Types.LSP_String;
function "-" (Name : Wide_Wide_String)
return LSP.Types.LSP_String is
begin
return Attr_List (J).To_Object.Value (+Name).To_String;
end "-";
Item : LSP.Messages.CompletionItem;
begin
Item.label := -"label";
Item.detail := (True, -"detail");
Item.documentation := (True, -"documentation");
Item.sortText := (True, -"sortText");
Item.filterText := (True, -"filterText");
Item.insertText := (True, -"insertText");
if Item.insertText.Value.Index ('$') > 0 then
Item.insertTextFormat := (True, LSP.Messages.Snippet);
end if;
Attr.Append (Item);
end;
end loop;
for J in 1 .. Hover_Keys.Length loop
declare
Key : constant League.Strings.Universal_String := Hover_Keys (J);
List : constant League.JSON.Arrays.JSON_Array :=
Hover.Value (Key).To_Array;
Next : LSP.Messages.MarkedString_Vectors.Vector;
begin
for K in 1 .. List.Length loop
declare
Value : constant League.JSON.Values.JSON_Value := List (K);
Item : LSP.Messages.MarkedString;
Object : League.JSON.Objects.JSON_Object;
begin
if Value.Is_String then
Item := (Is_String => True, Value => Value.To_String);
else
Object := Value.To_Object;
Item :=
(Is_String => False,
language => Object.Value (+"language").To_String,
value => Object.Value (+"value").To_String);
end if;
Next.Append (Item);
end;
end loop;
MarkedString_Map.Insert (Key, Next);
end;
end loop;
for J in 1 .. Sign_Keys.Length loop
declare
Key : constant League.Strings.Universal_String := Sign_Keys (J);
Object : constant League.JSON.Objects.JSON_Object :=
Sign.Value (Key).To_Object;
Result : LSP.Messages.SignatureInformation;
Params : League.JSON.Arrays.JSON_Array;
begin
Result.label := Object.Value (+"label").To_String;
Result.documentation :=
(True, Object.Value (+"documentation").To_String);
Params := Object.Value (+"params").To_Array;
for K in 1 .. Params.Length loop
declare
Value : constant League.JSON.Objects.JSON_Object :=
Params (K).To_Object;
Item : LSP.Messages.ParameterInformation;
begin
Item.label := Value.Value (+"label").To_String;
Item.documentation :=
(True, Value.Value (+"documentation").To_String);
Result.parameters.Append (Item);
end;
end loop;
Signatures.Insert (Key, Result);
end;
end loop;
end Initialize;
-----------------------
-- Pragma_Signatures --
-----------------------
function Pragma_Signatures
(Name : LSP.Types.LSP_String)
return LSP.Messages.SignatureInformation_Vectors.Vector
is
Cursor : constant SignatureInformation_Maps.Cursor :=
Signatures.Find (Name.To_Lowercase);
begin
if SignatureInformation_Maps.Has_Element (Cursor) then
return LSP.Messages.SignatureInformation_Vectors.To_Vector
(SignatureInformation_Maps.Element (Cursor), 1);
else
return LSP.Messages.SignatureInformation_Vectors.Empty_Vector;
end if;
end Pragma_Signatures;
---------------
-- Read_File --
---------------
function Read_File (Name : String)
return League.Stream_Element_Vectors.Stream_Element_Vector
is
Input : Ada.Streams.Stream_IO.File_Type;
Buffer : Ada.Streams.Stream_Element_Array (1 .. 1024);
Last : Ada.Streams.Stream_Element_Offset;
Result : League.Stream_Element_Vectors.Stream_Element_Vector;
begin
Ada.Streams.Stream_IO.Open (Input, Ada.Streams.Stream_IO.In_File, Name);
while not Ada.Streams.Stream_IO.End_Of_File (Input) loop
Ada.Streams.Stream_IO.Read (Input, Buffer, Last);
Result.Append (Buffer (1 .. Last));
end loop;
return Result;
end Read_File;
end Ada_Wellknown;
| 35.315068 | 79 | 0.591415 |
0e661bfc8ca7df8a41287ff62afb67ac1792b493 | 4,824 | ads | Ada | support/MinGW/lib/gcc/mingw32/9.2.0/adainclude/s-imenne.ads | orb-zhuchen/Orb | 6da2404b949ac28bde786e08bf4debe4a27cd3a0 | [
"CNRI-Python-GPL-Compatible",
"MIT"
] | null | null | null | support/MinGW/lib/gcc/mingw32/9.2.0/adainclude/s-imenne.ads | orb-zhuchen/Orb | 6da2404b949ac28bde786e08bf4debe4a27cd3a0 | [
"CNRI-Python-GPL-Compatible",
"MIT"
] | null | null | null | support/MinGW/lib/gcc/mingw32/9.2.0/adainclude/s-imenne.ads | orb-zhuchen/Orb | 6da2404b949ac28bde786e08bf4debe4a27cd3a0 | [
"CNRI-Python-GPL-Compatible",
"MIT"
] | null | null | null | ------------------------------------------------------------------------------
-- --
-- GNAT RUN-TIME COMPONENTS --
-- --
-- S Y S T E M . I M G _ E N U M _ N E W --
-- --
-- S p e c --
-- --
-- Copyright (C) 2000-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. --
-- --
------------------------------------------------------------------------------
-- Enumeration_Type'Image for all enumeration types except those in package
-- Standard (where we have no opportunity to build image tables), and in
-- package System (where it is too early to start building image tables).
-- Special routines exist for the enumeration types in these packages.
-- This is the new version of the package, for use by compilers built after
-- Nov 21st, 2007, which provides procedures that avoid using the secondary
-- stack. The original package System.Img_Enum is maintained in the sources
-- for bootstrapping with older versions of the compiler which expect to find
-- functions in this package.
pragma Compiler_Unit_Warning;
package System.Img_Enum_New is
pragma Pure;
procedure Image_Enumeration_8
(Pos : Natural;
S : in out String;
P : out Natural;
Names : String;
Indexes : System.Address);
-- Used to compute Enum'Image (Str) where Enum is some enumeration type
-- other than those defined in package Standard. Names is a string with
-- a lower bound of 1 containing the characters of all the enumeration
-- literals concatenated together in sequence. Indexes is the address of
-- an array of type array (0 .. N) of Natural_8, where N is the number of
-- enumeration literals in the type. The Indexes values are the starting
-- subscript of each enumeration literal, indexed by Pos values, with an
-- extra entry at the end containing Names'Length + 1. The reason that
-- Indexes is passed by address is that the actual type is created on the
-- fly by the expander. The desired 'Image value is stored in S (1 .. P)
-- and P is set on return. The caller guarantees that S is long enough to
-- hold the result and that the lower bound is 1.
procedure Image_Enumeration_16
(Pos : Natural;
S : in out String;
P : out Natural;
Names : String;
Indexes : System.Address);
-- Identical to Set_Image_Enumeration_8 except that it handles types using
-- array (0 .. Num) of Natural_16 for the Indexes table.
procedure Image_Enumeration_32
(Pos : Natural;
S : in out String;
P : out Natural;
Names : String;
Indexes : System.Address);
-- Identical to Set_Image_Enumeration_8 except that it handles types using
-- array (0 .. Num) of Natural_32 for the Indexes table.
end System.Img_Enum_New;
| 56.093023 | 78 | 0.533167 |
4ac4f29dc8a56f426e6faddf54f673040e1db832 | 3,480 | adb | Ada | sources/webgl/opengl-renderbuffers-internals.adb | godunko/adagl | 5b62d3bac6aa4e11084b4b19171dadbf805e95d6 | [
"BSD-3-Clause"
] | 6 | 2018-01-18T16:57:21.000Z | 2020-01-19T07:40:12.000Z | sources/webgl/opengl-renderbuffers-internals.adb | godunko/adagl | 5b62d3bac6aa4e11084b4b19171dadbf805e95d6 | [
"BSD-3-Clause"
] | null | null | null | sources/webgl/opengl-renderbuffers-internals.adb | godunko/adagl | 5b62d3bac6aa4e11084b4b19171dadbf805e95d6 | [
"BSD-3-Clause"
] | 1 | 2018-01-20T16:12:26.000Z | 2018-01-20T16:12:26.000Z | ------------------------------------------------------------------------------
-- --
-- Ada binding for OpenGL/WebGL --
-- --
-- Runtime Library Component --
-- --
------------------------------------------------------------------------------
-- --
-- Copyright © 2016-2018, 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. --
-- --
------------------------------------------------------------------------------
package body OpenGL.Renderbuffers.Internals is
----------------------------
-- Get_WebGL_Renderbuffer --
----------------------------
function Get_WebGL_Renderbuffer
(Self : OpenGL_Renderbuffer'Class)
return WebAPI.WebGL.Renderbuffers.WebGL_Renderbuffer_Access is
begin
return Self.Renderbuffer;
end Get_WebGL_Renderbuffer;
end OpenGL.Renderbuffers.Internals;
| 63.272727 | 78 | 0.441379 |
204442dc9150b11dba8b12af65003813f70c3646 | 910 | ads | Ada | src/hyperion-monitoring.ads | stcarrez/hyperion | 166b10135521ee6553affc1b79f0bee3a9c7ea43 | [
"Apache-2.0"
] | null | null | null | src/hyperion-monitoring.ads | stcarrez/hyperion | 166b10135521ee6553affc1b79f0bee3a9c7ea43 | [
"Apache-2.0"
] | null | null | null | src/hyperion-monitoring.ads | stcarrez/hyperion | 166b10135521ee6553affc1b79f0bee3a9c7ea43 | [
"Apache-2.0"
] | null | null | null | -----------------------------------------------------------------------
-- hyperion-monitoring -- Module monitoring
-- Copyright (C) 2018 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 Hyperion.Monitoring is
end Hyperion.Monitoring;
| 45.5 | 76 | 0.627473 |
cbba22e8d3493d06e01e2f29a981c201fc4ab233 | 1,836 | adb | Ada | regtests/ado-testsuite.adb | Letractively/ada-ado | f0863c6975ae1a2c5349daee1e98a04fe11ba11e | [
"Apache-2.0"
] | null | null | null | regtests/ado-testsuite.adb | Letractively/ada-ado | f0863c6975ae1a2c5349daee1e98a04fe11ba11e | [
"Apache-2.0"
] | null | null | null | regtests/ado-testsuite.adb | Letractively/ada-ado | f0863c6975ae1a2c5349daee1e98a04fe11ba11e | [
"Apache-2.0"
] | null | null | null | -----------------------------------------------------------------------
-- ado-testsuite -- Testsuite for ADO
-- Copyright (C) 2009, 2010, 2011, 2012, 2013, 2014 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 ADO.Tests;
with ADO.Drivers.Tests;
with ADO.Sequences.Tests;
with ADO.Schemas.Tests;
with ADO.Objects.Tests;
with ADO.Queries.Tests;
with ADO.Parameters.Tests;
with ADO.Datasets.Tests;
package body ADO.Testsuite is
use ADO.Tests;
procedure Drivers (Suite : in Util.Tests.Access_Test_Suite);
procedure Drivers (Suite : in Util.Tests.Access_Test_Suite) is separate;
Tests : aliased Util.Tests.Test_Suite;
function Suite return Util.Tests.Access_Test_Suite is
Ret : constant Util.Tests.Access_Test_Suite := Tests'Access;
begin
ADO.Drivers.Tests.Add_Tests (Ret);
ADO.Parameters.Tests.Add_Tests (Ret);
ADO.Sequences.Tests.Add_Tests (Ret);
ADO.Objects.Tests.Add_Tests (Ret);
ADO.Tests.Add_Tests (Ret);
ADO.Schemas.Tests.Add_Tests (Ret);
Drivers (Ret);
ADO.Queries.Tests.Add_Tests (Ret);
ADO.Datasets.Tests.Add_Tests (Ret);
return Ret;
end Suite;
end ADO.Testsuite;
| 34.641509 | 76 | 0.663943 |
0e50e11dc9e3d30a14bb7b28efb2589631fd317a | 5,623 | ads | Ada | src/stm32.ads | damaki/EVB1000 | 1589a3f3bd79d7c9970f3b0758e133e3ec1ee6e2 | [
"MIT"
] | 9 | 2016-07-06T21:26:41.000Z | 2020-11-22T11:21:58.000Z | bsp-examples/evb1000/stm32.ads | hao122065175/DW1000 | ce2906596e479c83ce64673e8e7cf03856c45523 | [
"MIT"
] | 1 | 2018-06-19T15:20:41.000Z | 2018-06-19T21:14:31.000Z | bsp-examples/evb1000/stm32.ads | hao122065175/DW1000 | ce2906596e479c83ce64673e8e7cf03856c45523 | [
"MIT"
] | 4 | 2018-07-18T03:35:25.000Z | 2020-11-22T11:21:59.000Z | -- This spec has been automatically generated from STM32F105xx.svd
pragma Restrictions (No_Elaboration_Code);
pragma Ada_2012;
with Interfaces; use Interfaces;
with System;
-- STM32F105xx
package STM32 is
pragma Preelaborate;
---------------
-- Base type --
---------------
subtype Word is Interfaces.Unsigned_32;
subtype Short is Interfaces.Unsigned_16;
subtype Byte is Interfaces.Unsigned_8;
type Bit is mod 2**1
with Size => 1;
type UInt2 is mod 2**2
with Size => 2;
type UInt3 is mod 2**3
with Size => 3;
type UInt4 is mod 2**4
with Size => 4;
type UInt5 is mod 2**5
with Size => 5;
type UInt6 is mod 2**6
with Size => 6;
type UInt7 is mod 2**7
with Size => 7;
type UInt9 is mod 2**9
with Size => 9;
type UInt10 is mod 2**10
with Size => 10;
type UInt11 is mod 2**11
with Size => 11;
type UInt12 is mod 2**12
with Size => 12;
type UInt13 is mod 2**13
with Size => 13;
type UInt14 is mod 2**14
with Size => 14;
type UInt15 is mod 2**15
with Size => 15;
type UInt17 is mod 2**17
with Size => 17;
type UInt18 is mod 2**18
with Size => 18;
type UInt19 is mod 2**19
with Size => 19;
type UInt20 is mod 2**20
with Size => 20;
type UInt21 is mod 2**21
with Size => 21;
type UInt22 is mod 2**22
with Size => 22;
type UInt23 is mod 2**23
with Size => 23;
type UInt24 is mod 2**24
with Size => 24;
type UInt25 is mod 2**25
with Size => 25;
type UInt26 is mod 2**26
with Size => 26;
type UInt27 is mod 2**27
with Size => 27;
type UInt28 is mod 2**28
with Size => 28;
type UInt29 is mod 2**29
with Size => 29;
type UInt30 is mod 2**30
with Size => 30;
type UInt31 is mod 2**31
with Size => 31;
--------------------
-- Base addresses --
--------------------
PWR_Base : constant System.Address :=
System'To_Address (16#40007000#);
GPIOA_Base : constant System.Address :=
System'To_Address (16#40010800#);
GPIOB_Base : constant System.Address :=
System'To_Address (16#40010C00#);
GPIOC_Base : constant System.Address :=
System'To_Address (16#40011000#);
GPIOD_Base : constant System.Address :=
System'To_Address (16#40011400#);
GPIOE_Base : constant System.Address :=
System'To_Address (16#40011800#);
AFIO_Base : constant System.Address :=
System'To_Address (16#40010000#);
EXTI_Base : constant System.Address :=
System'To_Address (16#40010400#);
DMA1_Base : constant System.Address :=
System'To_Address (16#40020000#);
DMA2_Base : constant System.Address :=
System'To_Address (16#40020400#);
RTC_Base : constant System.Address :=
System'To_Address (16#40002800#);
BKP_Base : constant System.Address :=
System'To_Address (16#40006C04#);
IWDG_Base : constant System.Address :=
System'To_Address (16#40003000#);
WWDG_Base : constant System.Address :=
System'To_Address (16#40002C00#);
TIM1_Base : constant System.Address :=
System'To_Address (16#40012C00#);
TIM2_Base : constant System.Address :=
System'To_Address (16#40000000#);
TIM3_Base : constant System.Address :=
System'To_Address (16#40000400#);
TIM4_Base : constant System.Address :=
System'To_Address (16#40000800#);
TIM5_Base : constant System.Address :=
System'To_Address (16#40000C00#);
TIM6_Base : constant System.Address :=
System'To_Address (16#40001000#);
TIM7_Base : constant System.Address :=
System'To_Address (16#40001400#);
I2C1_Base : constant System.Address :=
System'To_Address (16#40005400#);
I2C2_Base : constant System.Address :=
System'To_Address (16#40005800#);
SPI1_Base : constant System.Address :=
System'To_Address (16#40013000#);
SPI2_Base : constant System.Address :=
System'To_Address (16#40003800#);
SPI3_Base : constant System.Address :=
System'To_Address (16#40003C00#);
USART1_Base : constant System.Address :=
System'To_Address (16#40013800#);
USART2_Base : constant System.Address :=
System'To_Address (16#40004400#);
USART3_Base : constant System.Address :=
System'To_Address (16#40004800#);
ADC1_Base : constant System.Address :=
System'To_Address (16#40012400#);
ADC2_Base : constant System.Address :=
System'To_Address (16#40012800#);
CAN2_Base : constant System.Address :=
System'To_Address (16#40006800#);
CAN1_Base : constant System.Address :=
System'To_Address (16#40006400#);
USB_OTG_GLOBAL_Base : constant System.Address :=
System'To_Address (16#50000000#);
USB_OTG_HOST_Base : constant System.Address :=
System'To_Address (16#50000400#);
USB_OTG_DEVICE_Base : constant System.Address :=
System'To_Address (16#50000800#);
USB_OTG_PWRCLK_Base : constant System.Address :=
System'To_Address (16#50000E00#);
DAC_Base : constant System.Address :=
System'To_Address (16#40007400#);
DBG_Base : constant System.Address :=
System'To_Address (16#E0042000#);
UART4_Base : constant System.Address :=
System'To_Address (16#40004C00#);
UART5_Base : constant System.Address :=
System'To_Address (16#40005000#);
CRC_Base : constant System.Address :=
System'To_Address (16#40023000#);
FLASH_Base : constant System.Address :=
System'To_Address (16#40022000#);
RCC_Base : constant System.Address :=
System'To_Address (16#40021000#);
NVIC_Base : constant System.Address :=
System'To_Address (16#E000E000#);
end STM32;
| 32.131429 | 67 | 0.652321 |
20a4375659728e59b3c832eb9e3040d61930590c | 1,108 | ads | Ada | tests/units-overhead/src/units.ads | TUM-EI-RCS/StratoX | 5fdd04e01a25efef6052376f43ce85b5bc973392 | [
"BSD-3-Clause"
] | 12 | 2017-06-08T14:19:57.000Z | 2022-03-09T02:48:59.000Z | tests/units-overhead/src/units.ads | TUM-EI-RCS/StratoX | 5fdd04e01a25efef6052376f43ce85b5bc973392 | [
"BSD-3-Clause"
] | 6 | 2017-06-08T13:13:50.000Z | 2020-05-15T09:32:43.000Z | tests/units-overhead/src/units.ads | TUM-EI-RCS/StratoX | 5fdd04e01a25efef6052376f43ce85b5bc973392 | [
"BSD-3-Clause"
] | 3 | 2017-06-30T14:05:06.000Z | 2022-02-17T12:20:45.000Z |
package Units with
Spark_Mode is
type Unit_Type is new Float with -- As tagged Type? -> Generics with Unit_Type'Class
Dimension_System =>
((Unit_Name => Meter, Unit_Symbol => 'm', Dim_Symbol => 'L'),
(Unit_Name => Kilogram, Unit_Symbol => "kg", Dim_Symbol => 'M'),
(Unit_Name => Second, Unit_Symbol => 's', Dim_Symbol => 'T'),
(Unit_Name => Ampere, Unit_Symbol => 'A', Dim_Symbol => 'I'),
(Unit_Name => Kelvin, Unit_Symbol => 'K', Dim_Symbol => "Theta"),
(Unit_Name => Radian, Unit_Symbol => "Rad", Dim_Symbol => "A")),
Default_Value => 0.0;
-- Base Units
subtype Length_Type is Unit_Type with
Dimension => (Symbol => 'm', Meter => 1, others => 0);
subtype Time_Type is Unit_Type with
Dimension => (Symbol => 's', Second => 1, others => 0);
subtype Linear_Velocity_Type is Unit_Type with
Dimension => (Meter => 1, Second => -1, others => 0);
-- Base units
Meter : constant Length_Type := Length_Type (1.0);
Second : constant Time_Type := Time_Type (1.0);
end Units;
| 35.741935 | 89 | 0.587545 |
4a3241519e05846beb72cef7760948be77dde039 | 1,277 | ada | Ada | thirdparty/glut/README.ada | ShiroixD/pag_zad_2 | cdb6ccf48402cf4dbf1284827a4e281d3b12a64b | [
"MIT"
] | 2 | 2021-11-14T13:01:14.000Z | 2022-03-18T14:10:24.000Z | thirdparty/glut/README.ada | ShiroixD/pag_zad_2 | cdb6ccf48402cf4dbf1284827a4e281d3b12a64b | [
"MIT"
] | 1 | 2018-08-10T19:11:58.000Z | 2018-08-10T19:12:17.000Z | thirdparty/glut/README.ada | ShiroixD/pag_zad_2 | cdb6ccf48402cf4dbf1284827a4e281d3b12a64b | [
"MIT"
] | null | null | null |
GLUT 3.4 was the first release of GLUT to support an Ada language
binding for SGI's Ada run-time and development environment. (With a
bit of work, GLUT could probably be easily be adapted to other Ada
development environments, assuming the environment already has an
OpenGL binding.)
To use the SGI Ada binding, please make sure that the following GNAT
(SGI's Ada compiler) subsystems are installed on your system:
Ada Execution-only Environment (eoe)
-------------------------------------
gnat_eoe.sw.lib
Ada Development Option (dev)
-----------------------------
gnat_dev.bindings.GL
gnat_dev.bindings.std
gnat_dev.lib.src
gnat_dev.lib.obj
gnat_dev.sw.gnat
The GLUT Ada binding was developed and tested with the IRIX 5.3 and 6.2
gnat_dev and gnat_eoe images (v3.07, built 960827).
Some fairly simple GLUT examples written in Ada can be found in the
progs/ada subdirectory. GLUT 3.6 expanded the number of Ada example
programs included in the GLUT source code distribution. GLUT's actual
Ada binding is found in the adainclude/GL subdirectory.
To build the Ada binding and example programs, first build GLUT
normally, then:
cd adainclude/GL
make glut.o
cd ../../progs/ada
make
Good luck!
- Mark Kilgard
November 12, 1997
| 29.697674 | 71 | 0.722005 |
1816bbccb985bf39487ed71702c2355d88e330ff | 2,092 | adb | Ada | Ada/src/Problem_27.adb | Tim-Tom/project-euler | 177e0043ee93409742ec596c4379251f681b4275 | [
"Unlicense"
] | null | null | null | Ada/src/Problem_27.adb | Tim-Tom/project-euler | 177e0043ee93409742ec596c4379251f681b4275 | [
"Unlicense"
] | null | null | null | Ada/src/Problem_27.adb | Tim-Tom/project-euler | 177e0043ee93409742ec596c4379251f681b4275 | [
"Unlicense"
] | null | null | null | with Ada.Integer_Text_IO;
with Ada.Text_IO;
with PrimeInstances;
package body Problem_27 is
package IO renames Ada.Text_IO;
package I_IO renames Ada.Integer_Text_IO;
procedure Solve is
subtype Parameter is Integer range -999 .. 999;
subtype Output is Integer range -(Parameter'Last**2) .. Parameter'Last**2;
package Integer_Primes renames PrimeInstances.Integer_Primes;
primes : constant Integer_Primes.Sieve := Integer_Primes.Generate_Sieve(79*79 + 999*79 + 999);
function Is_Prime(n : Integer) return Boolean is
subtype Sieve_Index is Positive range primes'Range;
lower : Sieve_Index := primes'First;
upper : Sieve_Index := primes'Last;
midPoint : Sieve_Index;
begin
if n <= 1 then
return False;
end if;
-- Basic binary search
while lower <= upper loop
midPoint := (lower + upper) / 2;
if n = primes(midPoint) then
return True;
elsif n < primes(midPoint) then
upper := midPoint - 1;
else
lower := midPoint + 1;
end if;
end loop;
return False;
end Is_Prime;
function doQuad(n : Natural; a,b : parameter) return Integer is
begin
return n*n + a*n + b;
end doQuad;
highest_count : Natural := 0;
best_output : Output;
begin
for a in Parameter'Range loop
for prime_index in primes'Range loop
exit when primes(prime_index) > Parameter'Last;
declare
b : constant Parameter := Parameter(primes(prime_index));
n : Natural := 0;
begin
while Is_Prime(doQuad(n, a, b)) loop
n := n + 1;
end loop;
if n > highest_count then
highest_count := n;
best_output := a * b;
end if;
end;
end loop;
end loop;
I_IO.Put(best_output);
IO.New_Line;
end Solve;
end Problem_27;
| 33.741935 | 100 | 0.555927 |
dc56d200d7399b6c3a26847d8fd3975c3e9586bc | 2,760 | adb | Ada | src/shared/little_endian/lsc-internal-byteorder64.adb | Componolit/libsparkcrypto | 8531a07b6e9f5eb33eae0fa32759b4cbd3509d95 | [
"OpenSSL",
"Unlicense"
] | 30 | 2018-05-18T09:11:50.000Z | 2021-05-18T16:29:14.000Z | src/shared/little_endian/lsc-internal-byteorder64.adb | Componolit/libsparkcrypto | 8531a07b6e9f5eb33eae0fa32759b4cbd3509d95 | [
"OpenSSL",
"Unlicense"
] | 15 | 2018-12-13T07:53:36.000Z | 2019-09-24T19:43:35.000Z | src/shared/little_endian/lsc-internal-byteorder64.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 LSC.Internal.Byteswap64;
package body LSC.Internal.Byteorder64 is
function Native_To_BE (Item : Types.Word64) return Types.Word64
is
begin
return Byteswap64.Swap (Item);
end Native_To_BE;
---------------------------------------------------------------------------
function Native_To_LE (Item : Types.Word64) return Types.Word64
is
begin
return Item;
end Native_To_LE;
---------------------------------------------------------------------------
function BE_To_Native (Item : Types.Word64) return Types.Word64
is
begin
return Byteswap64.Swap (Item);
end BE_To_Native;
---------------------------------------------------------------------------
function LE_To_Native (Item : Types.Word64) return Types.Word64
is
begin
return Item;
end LE_To_Native;
end LSC.Internal.Byteorder64;
| 39.428571 | 79 | 0.621739 |
c546f9b34e3c017db62f84c90db1514e5fede404 | 40,312 | adb | Ada | lua.adb | jhumphry/aLua | 62c6e67deda5ebb2ce66ffb8eaf8746c9a92327d | [
"MIT"
] | null | null | null | lua.adb | jhumphry/aLua | 62c6e67deda5ebb2ce66ffb8eaf8746c9a92327d | [
"MIT"
] | null | null | null | lua.adb | jhumphry/aLua | 62c6e67deda5ebb2ce66ffb8eaf8746c9a92327d | [
"MIT"
] | null | null | null | -- Lua
-- an Ada 2012 interface to Lua
-- Copyright (c) 2015-2021, James Humphry - see LICENSE for terms
with Ada.Unchecked_Conversion, Ada.Unchecked_Deallocation;
with System.Address_To_Access_Conversions;
with Ada.Streams;
with Interfaces; use Interfaces;
with Interfaces.C;
use type Interfaces.C.int, Interfaces.C.size_t, Interfaces.C.ptrdiff_t;
with Interfaces.C.Strings;
use type Interfaces.C.Strings.chars_ptr;
with Interfaces.C.Pointers;
with System;
use type System.Address;
with Lua.Internal, Lua.AuxInternal;
package body Lua is
--
-- *** Routines only used internally
--
function Stream_Lua_Writer (L : void_ptr;
p : void_ptr;
sz : C.size_t;
ud : void_ptr)
return C.int with Convention => C;
function String_Lua_Reader (L : void_ptr;
data : void_ptr;
size : access C.size_t)
return C.Strings.chars_ptr
with Convention => C;
function Stream_Lua_Reader (L : void_ptr;
data : void_ptr;
size : access C.size_t)
return C.Strings.chars_ptr
with Convention => C;
function CFunction_Trampoline (L : System.Address) return Interfaces.C.int
with Convention => C;
--
-- *** Types only used internally
--
-- Used by String_Lua_Reader to read strings
type String_Details is
record
S_Address : System.Address;
S_Length : Natural;
Readable : Boolean := False;
end record;
type Stream_Details(Buffer_Size : Ada.Streams.Stream_Element_Count) is
record
S : access Ada.Streams.Root_Stream_Type'Class;
Buffer : aliased Ada.Streams.Stream_Element_Array(1..Buffer_Size)
with Convention => C;
end record;
type Stream_Element_Access is not null access all Ada.Streams.Stream_Element;
--
-- *** Conversions between Ada enumerations and C integer constants
--
function Int_To_Thread_Status is new
Ada.Unchecked_Conversion(Source => C.int,
Target => Thread_Status);
function Arith_Op_To_Int is new Ada.Unchecked_Conversion(Source => Arith_Op,
Target => C.int);
function Comparison_Op_To_Int is new
Ada.Unchecked_Conversion(Source => Comparison_Op,
Target => C.int);
function GC_Op_To_Int is new
Ada.Unchecked_Conversion(Source => GC_Op,
Target => C.int);
function GC_Param_To_Int is new
Ada.Unchecked_Conversion(Source => GC_Param,
Target => C.int);
function Lua_Type_To_Int is new Ada.Unchecked_Conversion(Source => Lua_Type,
Target => C.int);
function Int_To_Lua_Type is new Ada.Unchecked_Conversion(Source => C.int,
Target => Lua_Type);
--
-- *** Conversions between C pointers and Ada types
--
function AdaFunction_To_Address is new
Ada.Unchecked_Conversion(Source => AdaFunction,
Target => System.Address);
function Address_To_AdaFunction is new
Ada.Unchecked_Conversion(Source => System.Address,
Target => AdaFunction);
package Stream_Access_Conversions is new
System.Address_To_Access_Conversions(Ada.Streams.Root_Stream_Type'Class);
package String_Details_Access_Conversions is new
System.Address_To_Access_Conversions(String_Details);
package Char_Access_Conversions is new
System.Address_To_Access_Conversions(C.char);
function Char_Object_Pointer_To_Chars_Ptr is new
Ada.Unchecked_Conversion(Source => Char_Access_Conversions.Object_Pointer,
Target => C.Strings.chars_ptr);
package Stream_Details_Access_Conversions is new
System.Address_To_Access_Conversions(Stream_Details);
function Stream_Element_Access_To_Chars_Ptr is new
Ada.Unchecked_Conversion(Source => Stream_Element_Access,
Target => C.Strings.chars_ptr);
--
-- *** Conversions between a C void * and a Stream_Element_Array
--
package Void_Ptr_To_Stream_Array is new
Interfaces.C.Pointers(Index => Ada.Streams.Stream_Element_Offset,
Element => Ada.Streams.Stream_Element,
Element_Array => Ada.Streams.Stream_Element_Array,
Default_Terminator => 0);
package Stream_Element_Access_Conversions is new
System.Address_To_Access_Conversions(Ada.Streams.Stream_Element);
--
-- *** Special stack positions and the registry
--
function UpvalueIndex (i : in Integer) return Integer is
(RegistryIndex - i - 1);
-- Lua cannot call Ada functions directly, so a trampoline is used.
-- The first UpvalueIndex is reserved for the address of the Ada function
-- to be called by CFunction_Trampoline
--
-- *** Basic state control
--
-- The Stream_Lua_Writer is an internal Lua_Writer where the userdata pointer
-- is a Stream_Access type from Ada.Streams.Stream_IO. It should therefore
-- support writing to and from any type of stream.
function Stream_Lua_Writer (L : void_ptr;
p : void_ptr;
sz : C.size_t;
ud : void_ptr)
return C.int is
pragma Unreferenced (L);
package SAC renames Stream_Access_Conversions;
package SEAC renames Stream_Element_Access_Conversions;
package VPTSA renames Void_Ptr_To_Stream_Array;
use Ada.Streams;
use Ada.Streams.Stream_IO;
Output_Stream_Access : constant Stream_Access
:= Stream_Access(SAC.To_Pointer(ud));
-- First we need to convert the address of the data to dump to an access
-- value using System.Address_To_Access_Conversions, then we need to
-- convert this to the equivalent access value in Interfaces.C.Pointers.
-- Once we know the length of the array, we can then convert it back to a
-- true Ada array.
Output_Data_Access : constant VPTSA.Pointer
:= VPTSA.Pointer(SEAC.To_Pointer(p));
-- This calculation is intended to deal with (most) cases in which
-- Stream_Element is not a single byte. Why anyone would do that I
-- don't know, but it seems possible according to the RM. Cases in which
-- Stream_Element is a fractional number of bytes will not work, but
-- I can't see how an Ada system using such a convention could ever
-- be expected to interoperate with C code.
Output_Data_Length : constant C.ptrdiff_t
:= (C.ptrdiff_t(sz) * 8) / Stream_Element'Size;
Output_Data : constant Stream_Element_Array
:= VPTSA.Value(Ref => Output_Data_Access,
Length => Output_Data_Length);
begin
Output_Stream_Access.Write(Item => Output_Data);
return 0;
exception
when Status_Error | Mode_Error | Device_Error =>
return 1;
-- Other exceptions are deliberately not handled as they are more
-- likely to indicate serious internal problems, for example being
-- sent a null pointer as the data to write.
end Stream_Lua_Writer;
procedure DumpFile(L : in Lua_State;
Name : in String;
Strip : in Boolean := False) is
use Ada.Streams.Stream_IO;
Output_File : File_Type;
begin
Create(File => Output_File, Mode => Out_File, Name => Name);
DumpStream(L => L,
Output_Stream => Stream(Output_File),
Strip => Strip);
Close(Output_File);
end DumpFile;
procedure DumpStream(L : in Lua_State;
Output_Stream : in Ada.Streams.Stream_IO.Stream_Access;
Strip : in Boolean := False) is
package SAC renames Stream_Access_Conversions;
Result : C.int;
Stream_Pointer : constant SAC.Object_Pointer
:= SAC.Object_Pointer(Output_Stream);
begin
Result := Internal.lua_dump(L.L,
Stream_Lua_Writer'Access,
SAC.To_Address(Stream_Pointer),
(if Strip then 1 else 0));
if Result /= 0 then
raise Lua_Error with "Could not dump Lua chunk to stream";
end if;
end DumpStream;
function String_Lua_Reader (L : void_ptr;
data : void_ptr;
size : access C.size_t)
return C.Strings.chars_ptr is
pragma Unreferenced (L);
SDA : constant access String_Details
:= String_Details_Access_Conversions.To_Pointer(data);
S_Object_Ptr : constant Char_Access_Conversions.Object_Pointer
:= Char_Access_Conversions.To_Pointer(SDA.S_Address);
S_chars_ptr : constant C.Strings.chars_ptr
:= Char_Object_Pointer_To_Chars_Ptr(S_Object_Ptr);
begin
if SDA.Readable then
SDA.Readable := False;
size.all := C.size_t(SDA.S_Length * String'Component_Size / 8);
return S_chars_ptr;
else
size.all := 0;
return C.Strings.Null_Ptr;
end if;
end String_Lua_Reader;
function LoadString (L : in Lua_State;
S : aliased String;
ChunkName : in String := "";
Mode : Lua_ChunkMode := Binary_and_Text)
return Thread_Status is
Result : C.int;
C_ChunkName : C.Strings.chars_ptr := C.Strings.New_String(ChunkName);
C_Mode : C.Strings.chars_ptr
:= C.Strings.New_String(case Mode is
when Binary => "b",
when Text => "t",
when Binary_and_Text => "bt"
);
To_Load : aliased String_Details := (S_Address => S'Address,
S_Length => S'Length,
Readable => True);
begin
if C.char_array'Component_Size /= String'Component_Size then
raise Program_Error with
"Ada and C strings are not sufficiently compatible for direct " &
"loading - only LoadString_By_Copy can be used on this system.";
end if;
Result := Internal.lua_load(L.L,
String_Lua_Reader'Access,
To_Load'Address,
C_ChunkName,
C_Mode);
C.Strings.Free(C_ChunkName);
C.Strings.Free(C_Mode);
return Int_To_Thread_Status(Result);
end LoadString;
function LoadString_By_Copy (L : in Lua_State;
S : in String)
return Thread_Status is
CS : C.Strings.chars_ptr;
Result : C.int;
begin
CS := C.Strings.New_String(S);
Result := AuxInternal.luaL_loadstring(L.L, CS);
C.Strings.Free(CS);
return Int_To_Thread_Status(Result);
end;
function Stream_Lua_Reader (L : void_ptr;
data : void_ptr;
size : access C.size_t)
return C.Strings.chars_ptr is
pragma Unreferenced (L);
use Ada.Streams;
Stream_Detail : access Stream_Details
:= Stream_Details_Access_Conversions.To_Pointer(data);
Buffer_Ptr :constant C.Strings.chars_ptr
:= Stream_Element_Access_To_Chars_Ptr(Stream_Detail.Buffer(1)'Access);
Last_Read : Stream_Element_Offset;
begin
Read(Stream => Stream_Detail.S.all,
Item => Stream_Detail.Buffer,
Last => Last_Read);
if Last_Read /= 0 then
size.all := C.size_t(Last_Read * Stream_Element'Size / 8);
return Buffer_Ptr;
else
size.all := 0;
return C.Strings.Null_Ptr;
end if;
end Stream_Lua_Reader;
function LoadFile (L : in Lua_State;
Name : in String;
ChunkName : in String := "";
Mode : in Lua_ChunkMode := Binary_and_Text;
Buffer_Size : in Positive := 256)
return Thread_Status is
use Ada.Streams.Stream_IO;
Input_File : File_Type;
Result : Thread_Status;
begin
Open(File => Input_File,
Mode => In_File,
Name => Name);
Result := LoadStream(L => L,
Input_Stream => Stream(Input_File),
ChunkName => ChunkName,
Mode => Mode,
Buffer_Size => Buffer_Size);
Close(Input_File);
return Result;
end LoadFile;
function LoadStream (L : in Lua_State;
Input_Stream : in Ada.Streams.Stream_IO.Stream_Access;
ChunkName : in String := "";
Mode : in Lua_ChunkMode := Binary_and_Text;
Buffer_Size : in Positive := 256)
return Thread_Status is
use Ada.Streams;
C_ChunkName : C.Strings.chars_ptr := C.Strings.New_String(ChunkName);
C_Mode : C.Strings.chars_ptr
:= C.Strings.New_String(case Mode is
when Binary => "b",
when Text => "t",
when Binary_and_Text => "bt"
);
Stream_Detail : aliased Stream_Details(Stream_Element_Count(Buffer_Size));
Result : C.int;
begin
Stream_Detail.S := Input_Stream;
Result := Internal.lua_load(L.L,
Stream_Lua_Reader'Access,
Stream_Detail'Address,
C_ChunkName,
C_Mode);
C.Strings.Free(C_ChunkName);
C.Strings.Free(C_Mode);
return Int_To_Thread_Status(Result);
end LoadStream;
function Status (L : Lua_State) return Thread_Status is
(Int_To_Thread_Status(Internal.lua_status(L.L)));
function Version (L : Lua_State) return Long_Float is
(Long_Float(Internal.lua_version(L.L).all));
--
-- *** Calling, yielding and functions
--
procedure Call (L : in Lua_State;
nargs : in Integer;
nresults : in Integer) is
begin
Internal.lua_callk(L.L,
C.int(nargs),
C.int(nresults),
0,
null);
end Call;
procedure Call_Function (L : in Lua_State;
name : in String;
nargs : in Integer;
nresults : in Integer) is
begin
GetGlobal(L, name);
if not IsFunction(L, -1) then
raise Lua_Error with "Attempting to call a value that is not a Lua function";
end if;
Rotate(L, -1-nargs, 1);
Internal.lua_callk(L.L,
C.int(nargs),
C.int(nresults),
0,
null);
end Call_Function;
function PCall (L : in Lua_State;
nargs : in Integer;
nresults : in Integer;
msgh : in Integer := 0)
return Thread_Status is
(
Int_To_Thread_Status(
Internal.lua_pcallk(L.L,
C.int(nargs),
C.int(nresults),
C.int(msgh),
0,
null
)
)
);
function PCall_Function (L : in Lua_State;
name : in String;
nargs : in Integer;
nresults : in Integer;
msgh : in Integer := 0)
return Thread_Status is
Result : C.int;
begin
GetGlobal(L, name);
if not IsFunction(L, -1) then
raise Lua_Error with "Attempting to call a value that is not a Lua function";
end if;
Rotate(L, -1-nargs, 1);
Result := Internal.lua_pcallk(L.L,
C.int(nargs),
C.int(nresults),
C.int(msgh),
0,
null
);
return Int_To_Thread_Status(Result);
end PCall_Function;
procedure Register(L : in Lua_State; name : in String; f : in AdaFunction) is
C_name : C.Strings.chars_ptr := C.Strings.New_String(name);
begin
PushAdaClosure(L, f, 0);
Internal.lua_setglobal(L.L, C_name);
C.Strings.Free(C_name);
end Register;
--
-- *** Pushing values to the stack
--
procedure PushAdaClosure (L : in Lua_State;
f : in AdaFunction;
n : in Natural) is
begin
Internal.lua_pushlightuserdata(L.L, AdaFunction_To_Address(f));
L.Rotate(L.GetTop - n, 1);
Internal.lua_pushcclosure(L.L, CFunction_Trampoline'Access, C.int(1 + n));
end PushAdaClosure;
procedure PushAdaFunction (L : in Lua_State; f : in AdaFunction) is
begin
PushAdaClosure(L, f, 0);
end PushAdaFunction;
procedure PushBoolean (L : in Lua_State; b : in Boolean) is
begin
Internal.lua_pushboolean(L.L, C.int( (if b then 1 else 0) ) );
end PushBoolean;
procedure PushInteger (L : in Lua_State; n : in Lua_Integer) is
begin
Internal.lua_pushinteger(L.L, Internal.lua_Integer(n));
end PushInteger;
procedure PushNil (L : in Lua_State) is
begin
Internal.lua_pushnil(L.L);
end PushNil;
procedure PushNumber (L : in Lua_State; n : in Lua_Number) is
begin
Internal.lua_pushnumber(L.L, Internal.lua_Number(n));
end PushNumber;
procedure PushString (L : in Lua_State; s : in String) is
C_s : C.Strings.chars_ptr;
Discard : C.Strings.chars_ptr;
begin
C_s := C.Strings.New_String(s);
Discard := Internal.lua_pushstring(L.L, C_s);
C.Strings.Free(C_s);
end PushString;
function PushThread (L : in Lua_State) return Boolean is
(Internal.lua_pushthread(L.L) = 1);
procedure PushThread (L : in Lua_State) is
Discard : C.int;
begin
-- Not interested if this thread is the main thread of its state, so the
-- boolean result is discarded.
Discard := Internal.lua_pushthread(L.L);
end PushThread;
procedure SetUserValue (L : in Lua_State; index : in Integer) is
begin
Internal.lua_setuservalue(L.L, C.int(index));
end SetUserValue;
function StringToNumber (L : in Lua_State; s : in String) return Boolean is
C_String : C.Strings.chars_ptr := C.Strings.New_String(s);
Result : C.size_t;
begin
Result := Internal.lua_stringtonumber(L.L, C_String);
C.Strings.Free(C_String);
return Result /= 0;
end StringToNumber;
--
-- *** Pulling values from the stack
--
function ToAdaFunction (L : in Lua_State; index : in Integer)
return AdaFunction is
Upvalue : System.Address;
Upvalue_Name : C.Strings.chars_ptr;
begin
Upvalue_Name := Internal.lua_getupvalue(L.L, C.int(index), 1);
if Upvalue_Name = C.Strings.Null_Ptr then
raise Lua_Error with "Function referenced is not an AdaFunction";
end if;
Upvalue := Internal.lua_touserdata(L.L, -1);
Internal.lua_settop(L.L, -2);
return Address_To_AdaFunction(Upvalue);
end ToAdaFunction;
function ToBoolean (L : in Lua_State; index : in Integer) return Boolean is
(Internal.lua_toboolean(L.L, C.int(index)) /= 0);
function ToInteger (L : in Lua_State; index : in Integer) return Lua_Integer is
isnum : aliased C.int := 0;
result : Internal.lua_Integer;
begin
result := Internal.lua_tointegerx(L.L , C.int(index), isnum'Access);
if isnum = 0 then
raise Lua_Error with "Value at Lua stack index "
& Integer'Image(index)
& " is not convertible to an integer.";
end if;
return Lua_Integer(result);
end ToInteger;
function ToNumber (L : in Lua_State; index : in Integer) return Lua_Number is
isnum : aliased C.int := 0;
result : Internal.lua_Number;
begin
result := Internal.lua_tonumberx(L.L , C.int(index), isnum'Access);
if isnum = 0 then
raise Lua_Error with "Value at Lua stack index "
& Integer'Image(index)
& " is not convertible to a number.";
end if;
return Lua_Number(result);
end ToNumber;
function ToString (L : in Lua_State; index : in Integer) return String is
result : C.Strings.chars_ptr;
len : aliased C.size_t := 0;
begin
result := Internal.lua_tolstring(L.L, C.int(index), len'Access);
if len = 0 then
raise Lua_Error with "Value at Lua stack index "
& Integer'Image(index)
& " is not convertible to a string.";
else
declare
converted_result : String(1..Integer(len+1));
begin
C.To_Ada(Item => C.Strings.Value(result),
Target => converted_result,
Count => Natural(len),
Trim_Nul => False);
return converted_result;
end;
end if;
end ToString;
function ToThread (L : in Lua_State; index : in Integer) return Lua_Thread is
begin
return R : Lua_Thread do
R.L := Internal.lua_tothread(L.L, C.int(index));
if R.L = System.Null_Address then
raise Lua_Error with "Value at Lua stack index "
& Integer'Image(index)
& " is not a thread value.";
end if;
end return;
end ToThread;
--
-- *** Operations on values
--
procedure Arith (L : in Lua_State; op : in Arith_Op) is
begin
Internal.lua_arith(L.L, Arith_Op_To_Int(op));
end Arith;
function Compare (L : in Lua_State;
index1 : in Integer;
index2 : in Integer;
op : in Comparison_Op) return Boolean is
(Internal.lua_compare(L.L,
C.int(index1),
C.int(index2),
Comparison_Op_To_Int(op)) = 1);
procedure Concat (L : in Lua_State; n : in Integer) is
begin
Internal.lua_concat(L.L, C.int(n));
end Concat;
procedure Len (L : in Lua_State; index : Integer) is
begin
Internal.lua_len(L.L, C.int(index));
end Len;
function RawEqual(L : in Lua_State; index1, index2 : in Integer)
return Boolean is
(Internal.lua_rawequal(L.L, C.int(index1), C.int(index2)) /= 0);
function RawLen (L : in Lua_State; index : Integer) return Integer is
(Integer(Internal.lua_rawlen(L.L, C.int(index))));
--
-- *** Garbage Collector control
---
procedure GC (L : in Lua_State; what : in GC_Op) is
Discard : C.int;
begin
-- For the operations within subtype GC_Op, this will not return anything
-- interesting
Discard := Internal.lua_gc(L.L, GC_Op_To_Int(what), 0);
end GC;
function GC (L : in Lua_State; what : in GC_Param; data : in Integer)
return Integer is
(Integer(Internal.lua_gc(L.L, GC_Param_To_Int(what), C.int(data))));
function GC_IsRunning (L : in Lua_State) return Boolean is
(Internal.lua_gc(L.L, GCISRUNNING, 0) /= 0);
--
-- *** Stack manipulation and information
--
function AbsIndex (L : in Lua_State; idx : in Integer) return Integer is
(Integer(Internal.lua_absindex(L.L, C.int(idx))));
function CheckStack (L : in Lua_State; n : in Integer) return Boolean is
(Internal.lua_checkstack(L.L, C.int(n)) /= 0);
procedure Copy (L : in Lua_State; fromidx : in Integer; toidx : in Integer) is
begin
Internal.lua_copy(L.L, C.int(fromidx), C.int(toidx));
end Copy;
function GetTop (L : in Lua_State) return Integer is
(Integer(Internal.lua_gettop(L.L)));
procedure Insert (L : in Lua_State; index : in Integer) is
begin
Internal.lua_rotate(L.L, C.int(index), 1);
end Insert;
procedure Pop (L : in Lua_State; n : in Integer) is
begin
Internal.lua_settop(L.L, -C.int(n)-1);
end Pop;
procedure PushValue (L : in Lua_State; index : in Integer) is
begin
Internal.lua_pushvalue(L.L, C.int(index));
end PushValue;
procedure Remove (L : in Lua_State; index : in Integer) is
begin
Internal.lua_rotate(L.L, C.int(index), -1);
Internal.lua_settop(L.L, -2);
end Remove;
procedure Replace (L : in Lua_State; index : in Integer) is
begin
Internal.lua_copy(L.L, -1, C.int(index));
Internal.lua_settop(L.L, -2);
end Replace;
procedure Rotate (L : in Lua_State; idx : in Integer; n : in Integer) is
begin
Internal.lua_rotate(L.L, C.int(idx), C.int(n));
end Rotate;
procedure SetTop (L : in Lua_State; index : in Integer) is
begin
Internal.lua_settop(L.L, C.int(index));
end SetTop;
--
-- *** Type information
--
function IsAdaFunction (L : in Lua_State; index : in Integer) return Boolean is
use Lua.Internal;
begin
return lua_tocfunction(L.L, C.int(index)) = CFunction_Trampoline'Access;
-- As CFunction_Trampoline is not visible outside this body, and this
-- package will always create closure correctly, it is not necessary
-- to check that the required upvalue exists.
end IsAdaFunction;
function IsBoolean (L : in Lua_State; index : in Integer) return Boolean is
(TypeInfo(L, index) = TBOOLEAN);
function IsCFunction (L : in Lua_State; index : in Integer) return Boolean is
(Internal.lua_iscfunction(L.L, C.int(index)) /= 0);
function IsFunction (L : in Lua_State; index : in Integer) return Boolean is
(TypeInfo(L, index) = TFUNCTION);
function IsInteger (L : in Lua_State; index : in Integer) return Boolean is
(Internal.lua_isinteger(L.L, C.int(index)) /= 0);
function IsLightuserdata (L : in Lua_State; index : in Integer) return Boolean is
(TypeInfo(L, index) = TLIGHTUSERDATA);
function IsNil (L : in Lua_State; index : in Integer) return Boolean is
(TypeInfo(L, index) = TNIL);
function IsNone (L : in Lua_State; index : in Integer) return Boolean is
(TypeInfo(L, index) = TNONE);
function IsNoneOrNil (L : in Lua_State; index : in Integer) return Boolean is
(TypeInfo(L, index) = TNONE or TypeInfo(L, index) = TNIL);
function IsNumber (L : in Lua_State; index : in Integer) return Boolean is
(Internal.lua_isnumber(L.L, C.int(index)) /= 0);
function IsString (L : in Lua_State; index : in Integer) return Boolean is
(Internal.lua_isstring(L.L, C.int(index)) /= 0);
function IsTable (L : in Lua_State; index : in Integer) return Boolean is
(TypeInfo(L, index) = TTABLE);
function IsThread (L : in Lua_State; index : in Integer) return Boolean is
(TypeInfo(L, index) = TTHREAD);
function IsUserdata (L : in Lua_State; index : in Integer) return Boolean is
(Internal.lua_isuserdata(L.L, C.int(index)) /= 0);
function TypeInfo (L : in Lua_State; index : in Integer) return Lua_Type is
(
Int_To_Lua_Type(Internal.lua_type(L.L, C.int(index)))
);
function TypeName (L : in Lua_State; tp : in Lua_Type) return String is
(
C.Strings.Value(Internal.lua_typename(L.L, C.int(Lua_Type_To_Int(tp))))
);
function TypeName (L : in Lua_State; index : in Integer) return String is
(TypeName(L, TypeInfo(L, index)));
function Userdata_Name (L : in Lua_State; index : in Integer) return String is
Has_Metatable : Boolean;
Name_Field_Type : Lua_Type;
begin
Has_Metatable := GetMetatable(L, index);
if not Has_Metatable then
return "";
end if;
Name_Field_Type := L.GetField(-1, "__name");
if Name_Field_Type = TNIL then
L.Pop(1); -- just the metatable
return "";
elsif Name_Field_Type /= TSTRING then
L.Pop(2); -- the metatable and the non-standard __name field
return "";
end if;
declare
Name : constant String := L.ToString(-1);
begin
if Name'Length > 4
and then Name(Name'First..Name'First+3) = "Ada:"
then
L.Pop(2); -- the metatable and the __name field
return (Name(Name'First+4..Name'Last));
else
L.Pop(2); -- the metatable and the non-Ada __name field
return "";
end if;
end;
end Userdata_Name;
--
-- *** Table Manipulation
--
procedure CreateTable (L : in Lua_State;
narr : in Integer := 0;
nrec : in Integer := 0) is
begin
Internal.lua_createtable(L.L, C.int(narr), C.int(nrec));
end CreateTable;
procedure NewTable (L : in Lua_State) is
begin
Internal.lua_createtable(L.L, 0, 0);
end NewTable;
function GetField (L : in Lua_State; index : in Integer; k : in String)
return Lua_Type is
Result : C.int;
C_k : C.Strings.chars_ptr := C.Strings.New_String(k);
begin
Result := Internal.lua_getfield(L.L,
C.int(index),
C_k);
C.Strings.Free(C_k);
return Int_To_Lua_Type(Result);
end GetField;
procedure GetField (L : in Lua_State; index : in Integer; k : in String) is
Result_Type : C.int;
C_k : C.Strings.chars_ptr := C.Strings.New_String(k);
begin
Result_Type := Internal.lua_getfield(L.L,
C.int(index),
C_k);
C.Strings.Free(C_k);
if Int_To_Lua_Type(Result_Type) = TNIL then
raise Lua_Error with "No value for key: '" & k & "'.";
end if;
end GetField;
function Geti (L : in Lua_State; index : in Integer; i : in Lua_Integer)
return Lua_Type is
(
Int_To_Lua_Type(Internal.lua_geti(L.L,
C.int(index),
Long_Long_Integer(i)))
);
procedure Geti (L : in Lua_State; index : in Integer; i : in Lua_Integer) is
Result_Type : C.int;
begin
Result_Type := Internal.lua_geti(L.L, C.int(index), Long_Long_Integer(i));
if Int_To_Lua_Type(Result_Type) = TNIL then
raise Lua_Error with "No value for key: '" & Lua_Integer'Image(i) &
"'.";
end if;
end Geti;
function GetTable (L : in Lua_State; index : in Integer) return Lua_Type is
(
Int_To_Lua_Type(Internal.lua_gettable(L.L, C.int(index)))
);
procedure GetTable (L : in Lua_State; index : in Integer) is
Result_Type : C.int;
begin
Result_Type := Internal.lua_gettable(L.L, C.int(index));
if Int_To_Lua_Type(Result_Type) = TNIL then
raise Lua_Error with "No value for key and target specified.";
end if;
end GetTable;
function Next (L : in Lua_State; index : in Integer) return Boolean is
(Internal.lua_next(L.L, C.int(index)) /= 0);
function RawGet (L : in Lua_State; index : in Integer) return Lua_Type is
(
Int_To_Lua_Type(Internal.lua_rawget(L.L, C.int(index)))
);
procedure RawGet (L : in Lua_State; index : in Integer) is
Result_Type : C.int;
begin
Result_Type := Internal.lua_rawget(L.L, C.int(index));
if Int_To_Lua_Type(Result_Type) = TNIL then
raise Lua_Error with "No value for key and target specified.";
end if;
end RawGet;
function RawGeti (L : in Lua_State; index : in Integer; i : in Lua_Integer)
return Lua_Type is
(
Int_To_Lua_Type(Internal.lua_rawgeti(L.L,
C.int(index),
Long_Long_Integer(i))
)
);
procedure RawGeti (L : in Lua_State; index : in Integer; i : in Lua_Integer) is
Result_Type : C.int;
begin
Result_Type := Internal.lua_rawgeti(L.L, C.int(index), Long_Long_Integer(i));
if Int_To_Lua_Type(Result_Type) = TNIL then
raise Lua_Error with "No value for key: '" & Lua_Integer'Image(i) &
"'.";
end if;
end RawGeti;
procedure RawSet (L : in Lua_State; index : in Integer) is
begin
Internal.lua_rawset(L.L, C.int(index));
end RawSet;
procedure RawSeti (L : in Lua_State; index : in Integer; i : in Lua_Integer)
is
begin
Internal.lua_rawseti(L.L, C.int(index), Long_Long_Integer(i));
end RawSeti;
procedure SetField (L : in Lua_State; index : in Integer; k : in String) is
C_k : C.Strings.chars_ptr := C.Strings.New_String(k);
begin
Internal.lua_setfield(L.L, C.int(index), C_k);
C.Strings.Free(C_k);
end SetField;
procedure Seti (L : in Lua_State; index : in Integer; i : in Lua_Integer) is
begin
Internal.lua_seti(L.L, C.int(index), Long_Long_Integer(i));
end Seti;
procedure SetTable (L : in Lua_State; index : in Integer) is
begin
Internal.lua_settable(L.L, C.int(index));
end SetTable;
--
-- *** Globals and Metatables
--
function GetGlobal (L : in Lua_State; name : in String) return Lua_Type is
C_name : C.Strings.chars_ptr := C.Strings.New_String(name);
Result : C.int;
begin
Result := Internal.lua_getglobal(L.L, C_name);
C.Strings.Free(C_name);
return Int_To_Lua_Type(Result);
end GetGlobal;
procedure GetGlobal (L : in Lua_State; name : in String) is
C_name : C.Strings.chars_ptr := C.Strings.New_String(name);
Result_Type : C.int;
begin
Result_Type := Internal.lua_getglobal(L.L, C_name);
C.Strings.Free(C_name);
if Int_To_Lua_Type(Result_Type) = TNIL then
raise Lua_Error with "No global by the name of :'" & name & "' found.";
end if;
end GetGlobal;
function GetMetatable (L : in Lua_State; index : in Integer) return Boolean is
(Internal.lua_getmetatable(L.L, C.int(index)) /= 0);
procedure GetMetatable (L : in Lua_State; index : in Integer) is
begin
if Internal.lua_getmetatable(L.L, C.int(index)) = 0 then
raise Lua_Error with "No metatable exists for stack index: " &
Integer'Image(index);
end if;
end GetMetatable;
procedure PushGlobalTable (L : in Lua_State) is
Discard : C.int;
begin
-- The global table should always exist so no test is performed.
Discard := Internal.lua_rawgeti(L.L,
C.int(RegistryIndex),
Long_Long_Integer(RIDX_Globals));
end PushGlobalTable;
procedure SetGlobal (L : in Lua_State; name : in String) is
C_name : C.Strings.chars_ptr := C.Strings.New_String(name);
begin
Internal.lua_setglobal(L.L, C_name);
C.Strings.Free(C_name);
end SetGlobal;
procedure SetMetatable (L : in Lua_State; index : in Integer) is
Discard : C.int;
begin
-- According to the Lua documentation, lua_setmetatable does not have a
-- return value, but according to lua.h it does...
Discard := Internal.lua_setmetatable(L.L, C.int(index));
end SetMetatable;
--
-- *** Threads
--
function IsYieldable (L : in Lua_State'Class) return Boolean is
begin
return Internal.lua_isyieldable(L.L) /= 0;
end IsYieldable;
function NewThread (L : in Lua_State'Class) return Lua_Thread is
begin
return T : Lua_Thread do
T.L := Internal.lua_newthread(L.L);
end return;
end NewThread;
function Resume(L : in Lua_State'Class;
nargs : in Integer;
from : in Lua_State'Class := Null_Thread
)
return Thread_Status is
(Int_To_Thread_Status(Internal.lua_resume(L.L, from.L, C.int(nargs))));
procedure XMove (from, to : in Lua_Thread; n : in Integer) is
begin
Internal.lua_xmove(from.L, to.L, C.int(n));
end XMove;
procedure Yield (L : in Lua_State; nresults : Integer) is
Discard : C.int;
begin
-- Return value does not appear to be useful.
Discard := Internal.lua_yieldk(L.L, C.int(nresults), 0, null);
end Yield;
--
-- *** Resource Management ***
--
procedure Initialize (Object : in out Lua_State) is
begin
Object.L := AuxInternal.luaL_newstate;
end Initialize;
procedure Finalize (Object : in out Lua_State) is
begin
Internal.lua_close(Object.L);
end Finalize;
--
-- *** Trampolines
--
function CFunction_Trampoline (L : System.Address) return C.int is
S : Existing_State;
f_index : constant C.int := C.int(RegistryIndex-1);
f_address : constant System.Address := Internal.lua_touserdata(L, f_index);
f : constant AdaFunction := Address_To_AdaFunction(f_address);
begin
S.L := L;
return C.int(f(S));
end CFunction_Trampoline;
--
-- *** References
--
procedure Free is
new Ada.Unchecked_Deallocation ( Object => Lua_Reference_Value,
Name => Lua_Reference_Value_Access);
function Ref (L : in Lua_State'Class; t : in Integer := RegistryIndex)
return Lua_Reference is
begin
return R : Lua_Reference do
R.E := new Lua_Reference_Value;
R.E.State := L.L;
R.E.Table := C.int(t);
R.E.Ref := AuxInternal.luaL_ref(L.L, C.int(t));
R.E.Count := 1;
end return;
end Ref;
function Get (L : in Lua_State; R : Lua_Reference'Class) return Lua_Type is
begin
if R.E = null then
raise Lua_Error with "Empty Lua reference used";
elsif R.E.State /= L.L then
raise Lua_Error with "Lua reference used on the wrong state!";
end if;
return Int_To_Lua_Type(Internal.lua_rawgeti(R.E.all.State,
R.E.all.Table,
Long_Long_Integer(R.E.all.Ref)));
end Get;
procedure Get (L : in Lua_State; R : Lua_Reference'Class) is
Result_Type : C.int;
begin
if R.E = null then
raise Lua_Error with "Empty Lua reference used";
elsif R.E.State /= L.L then
raise Lua_Error with "Lua reference used on the wrong state!";
end if;
Result_Type := Internal.lua_rawgeti(R.E.all.State,
R.E.all.Table,
Long_Long_Integer(R.E.all.Ref));
if Int_To_Lua_Type(Result_Type) = TNIL then
raise Lua_Error with "Lua reference somehow pointing to nil value.";
end if;
end Get;
overriding procedure Adjust (Object : in out Lua_Reference) is
begin
if Object.E /= null then
Object.E.Count := Object.E.Count + 1;
end if;
end Adjust;
overriding procedure Finalize (Object : in out Lua_Reference) is
begin
if Object.E /= null then
Object.E.Count := Object.E.Count - 1;
if Object.E.Count = 0 then
-- Note this relies on the Lua state not having been destroyed
-- before the references stop being used.
AuxInternal.luaL_unref(Object.E.State,
Object.E.Table,
Object.E.Ref);
Free(Object.E);
end if;
end if;
end Finalize;
end Lua;
| 34.484175 | 86 | 0.58263 |
d0ee56872ffef55eb6b885d9235b1ea698edcede | 1,922 | ada | Ada | gcc-gcc-7_3_0-release/gcc/testsuite/ada/acats/tests/a/ad7101a.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/a/ad7101a.ada | best08618/asylo | 5a520a9f5c461ede0f32acc284017b737a43898c | [
"Apache-2.0"
] | null | null | null | gcc-gcc-7_3_0-release/gcc/testsuite/ada/acats/tests/a/ad7101a.ada | best08618/asylo | 5a520a9f5c461ede0f32acc284017b737a43898c | [
"Apache-2.0"
] | 2 | 2020-07-27T00:22:36.000Z | 2021-04-01T09:41:02.000Z | -- AD7101A.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 MIN_INT AND MAX_INT ARE DECLARED IN PACKAGE SYSTEM
-- AND THAT BOTH ARE STATIC AND HAVE TYPE <UNIVERSAL INTEGER>.
-- HISTORY:
-- JET 09/10/87 CREATED ORIGINAL TEST.
WITH SYSTEM;
WITH REPORT; USE REPORT;
PROCEDURE AD7101A IS
U_MIN : CONSTANT := SYSTEM.MIN_INT;
U_MAX : CONSTANT := SYSTEM.MAX_INT;
TYPE S_MIN IS RANGE SYSTEM.MIN_INT .. 7;
TYPE S_MAX IS RANGE 7 .. SYSTEM.MAX_INT;
BEGIN
TEST ("AD7101A", "CHECK THAT MIN_INT AND MAX_INT ARE DECLARED " &
"IN PACKAGE SYSTEM AND THAT BOTH ARE STATIC " &
"AND HAVE TYPE <UNIVERSAL INTEGER>");
RESULT;
END AD7101A;
| 36.961538 | 79 | 0.669095 |
cb81495a9b1f3fbfd3f0ac52a3db3ea838b04ca8 | 253 | adb | Ada | gcc-gcc-7_3_0-release/gcc/testsuite/gnat.dg/lto7.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/lto7.adb | best08618/asylo | 5a520a9f5c461ede0f32acc284017b737a43898c | [
"Apache-2.0"
] | null | null | null | gcc-gcc-7_3_0-release/gcc/testsuite/gnat.dg/lto7.adb | best08618/asylo | 5a520a9f5c461ede0f32acc284017b737a43898c | [
"Apache-2.0"
] | 2 | 2020-07-27T00:22:36.000Z | 2021-04-01T09:41:02.000Z | -- { dg-do run }
-- { dg-options "-flto" { target lto } }
with Lto7_Pkg; use Lto7_Pkg;
procedure Lto7 is
view2 : access Iface_2'Class;
obj : aliased DT := (m_name => "Abdu");
begin
view2 := Iface_2'Class(obj)'Access;
view2.all.op2;
end;
| 19.461538 | 44 | 0.620553 |
dc4e29f6ef4ef2415408b32d1203214cdd6f4764 | 7,948 | adb | Ada | child_processes-wait_and_buffer.adb | annexi-strayline/AURA | fbbc4bc963ee82872a67e088b68f0565ba5b50a7 | [
"BSD-3-Clause"
] | 13 | 2021-09-28T18:14:32.000Z | 2022-02-09T17:48:53.000Z | child_processes-wait_and_buffer.adb | annexi-strayline/AURA | fbbc4bc963ee82872a67e088b68f0565ba5b50a7 | [
"BSD-3-Clause"
] | 9 | 2021-09-28T19:18:25.000Z | 2022-01-14T22:54:06.000Z | child_processes-wait_and_buffer.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 --
-- --
-- ------------------------------------------------------------------------ --
-- --
-- Copyright (C) 2020, 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.Text_IO;
with Ada.Calendar; use Ada.Calendar;
with Child_Processes.Standard_IO;
procedure Child_Processes.Wait_And_Buffer
(Process : in out Child_Process'Class;
Poll_Rate: in Duration;
Timeout : in Duration;
Output : out Buffer_Type;
Error : out Buffer_Type;
Timed_Out: out Boolean;
Status : out Exit_Status)
is
use Standard_IO;
type IO_Stream_Access is access all Standard_IO_Stream'Class with
Storage_Size => 0;
STDOUT: constant IO_Stream_Access
:= IO_Stream_Access (Process.IO_Stream (Standard_Output));
STDERR: constant IO_Stream_Access
:= IO_Stream_Access (Process.IO_Stream (Standard_Error));
package Stream_Buffers is
type Stream_Buffer is new Root_Stream_Type with
record
Buffer: Stream_Element_Array (1 .. 512);
-- Note there is a GNAT bug here where if this array is any
-- larger than 512, To_String can't handle it.
Level : Stream_Element_Offset := 0;
end record;
-- To reduce the number of system calls
overriding
procedure Write (Stream: in out Stream_Buffer;
Item : in Stream_Element_Array)
is null;
overriding
procedure Read (Stream: in out Stream_Buffer;
Item : out Stream_Element_Array;
Last : out Stream_Element_Offset);
not overriding
function To_String (Stream: aliased in out Stream_Buffer)
return String;
end Stream_Buffers;
package body Stream_Buffers is
----------
-- Read --
----------
-- The purpose of Read is to use the Ada stream attributes for String
-- to voncert from out Stream_Element_Array to a String. Obviously this
-- call only happens here, so we are strict in what we expect for the
-- parameters -> that they exactly fit the size of the buffer
procedure Read (Stream: in out Stream_Buffer;
Item : out Stream_Element_Array;
Last : out Stream_Element_Offset)
is
Buffer_Slice: Stream_Element_Array
renames Stream.Buffer (Stream.Buffer'First .. Stream.Level);
begin
Item := Stream.Buffer (Stream.Buffer'First .. Stream.Level);
Last := Item'Last;
Stream.Level := 0;
end Read;
---------------
-- To_String --
---------------
function To_String (Stream: aliased in out Stream_Buffer)
return String
is
pragma Assert (Character'Stream_Size = Stream_Element'Size);
-- To be honest, we're pretty darn sure this is always going to be
-- one Character per Stream_Element, but this is good form.
begin
return S: String (1 .. Natural (Stream.Level)) do
String'Read (Stream'Access, S);
end return;
end To_String;
end Stream_Buffers;
use Stream_Buffers;
Out_Buffer: aliased Stream_Buffer;
Err_Buffer: aliased Stream_Buffer;
Start: Time;
Discard: Boolean;
procedure Drain_Streams is
begin
loop
STDOUT.Read_Immediate (Item => Out_Buffer.Buffer,
Last => Out_Buffer.Level);
STDERR.Read_Immediate (Item => Err_Buffer.Buffer,
Last => Err_Buffer.Level);
exit when Out_Buffer.Level = 0 and Err_Buffer.Level = 0;
if Out_Buffer.Level > 0 then
Append (Buffer => Output,
Item => Out_Buffer.To_String);
end if;
if Err_Buffer.Level > 0 then
Append (Buffer => Error,
Item => Err_Buffer.To_String);
end if;
end loop;
end Drain_Streams;
begin
Timed_Out := False;
Start := Clock;
Output := Empty_Buffer;
Error := Empty_Buffer;
loop
Drain_Streams;
if Process.Terminated then
-- Get the status
Process.Wait_Terminated (Timeout => 0.0,
Timed_Out => Discard,
Status => Status);
-- Drain one last time
Drain_Streams;
return;
end if;
delay Poll_Rate;
exit when Clock > Start + Timeout;
end loop;
Drain_Streams;
Timed_Out := True;
end Child_Processes.Wait_And_Buffer;
| 39.346535 | 78 | 0.494338 |
2079fe7d8ffc0ab966578bd2f3e9aa015443538d | 4,594 | adb | Ada | src/gen-artifacts-distribs-bundles.adb | jquorning/dynamo | 10d68571476c270b8e45a9c5ef585fa9139b0d05 | [
"Apache-2.0"
] | 15 | 2015-01-18T23:04:19.000Z | 2022-03-01T20:27:08.000Z | src/gen-artifacts-distribs-bundles.adb | jquorning/dynamo | 10d68571476c270b8e45a9c5ef585fa9139b0d05 | [
"Apache-2.0"
] | 16 | 2018-06-10T07:09:30.000Z | 2022-03-26T18:28:40.000Z | src/gen-artifacts-distribs-bundles.adb | jquorning/dynamo | 10d68571476c270b8e45a9c5ef585fa9139b0d05 | [
"Apache-2.0"
] | 3 | 2015-11-11T18:00:14.000Z | 2022-01-30T23:08:45.000Z | -----------------------------------------------------------------------
-- gen-artifacts-distribs-bundles -- Merge bundles for distribution artifact
-- Copyright (C) 2013, 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.Directories;
with Ada.Exceptions;
with Ada.IO_Exceptions;
with Ada.Text_IO;
with Util.Log.Loggers;
with Util.Properties;
package body Gen.Artifacts.Distribs.Bundles is
use Util.Log;
Log : constant Loggers.Logger := Loggers.Create ("Gen.Artifacts.Distribs.Bundles");
-- ------------------------------
-- Create a distribution rule to copy a set of files or directories.
-- ------------------------------
function Create_Rule (Node : in DOM.Core.Node) return Distrib_Rule_Access is
pragma Unreferenced (Node);
Result : constant Bundle_Rule_Access := new Bundle_Rule;
begin
return Result.all'Access;
end Create_Rule;
-- ------------------------------
-- Get a name to qualify the installation rule (used for logs).
-- ------------------------------
overriding
function Get_Install_Name (Rule : in Bundle_Rule) return String is
pragma Unreferenced (Rule);
begin
return "bundle";
end Get_Install_Name;
-- ------------------------------
-- Install the file <b>File</b> according to the distribution rule.
-- Merge all the files listed in <b>Files</b> in the target path specified by <b>Path</b>.
-- ------------------------------
overriding
procedure Install (Rule : in Bundle_Rule;
Path : in String;
Files : in File_Vector;
Context : in out Generator'Class) is
procedure Load_File (File : in File_Record);
procedure Merge_Property (Name : in String;
Item : in Util.Properties.Value);
procedure Save_Property (Name : in String;
Item : in Util.Properties.Value);
Dir : constant String := Ada.Directories.Containing_Directory (Path);
Output : Ada.Text_IO.File_Type;
Merge : Util.Properties.Manager;
-- ------------------------------
-- Merge the property into the target property list.
-- ------------------------------
procedure Merge_Property (Name : in String;
Item : in Util.Properties.Value) is
begin
Merge.Set_Value (Name, Item);
end Merge_Property;
procedure Save_Property (Name : in String;
Item : in Util.Properties.Value) is
begin
Ada.Text_IO.Put (Output, Name);
Ada.Text_IO.Put (Output, "=");
Ada.Text_IO.Put_Line (Output, Util.Properties.To_String (Item));
end Save_Property;
-- ------------------------------
-- Append the file to the output
-- ------------------------------
procedure Load_File (File : in File_Record) is
File_Path : constant String := Rule.Get_Source_Path (File);
Props : Util.Properties.Manager;
begin
Log.Info ("loading {0}", File_Path);
Props.Load_Properties (Path => File_Path);
Props.Iterate (Process => Merge_Property'Access);
exception
when Ex : Ada.IO_Exceptions.Name_Error =>
Context.Error ("Cannot read {0}: ", File_Path, Ada.Exceptions.Exception_Message (Ex));
end Load_File;
Iter : File_Cursor := Files.First;
begin
Ada.Directories.Create_Path (Dir);
while File_Record_Vectors.Has_Element (Iter) loop
File_Record_Vectors.Query_Element (Iter, Load_File'Access);
File_Record_Vectors.Next (Iter);
end loop;
Ada.Text_IO.Create (File => Output, Mode => Ada.Text_IO.Out_File, Name => Path);
Merge.Iterate (Process => Save_Property'Access);
Ada.Text_IO.Close (File => Output);
end Install;
end Gen.Artifacts.Distribs.Bundles;
| 37.966942 | 98 | 0.579016 |
4a6477105f59cf5ebfee09e43f0c84c5a96178a4 | 1,183 | ads | Ada | Sources/Library/quaternions.ads | ForYouEyesOnly/Space-Convoy | be4904f6a02695f7c4c5c3c965f4871cd3250003 | [
"MIT"
] | 1 | 2019-09-21T09:40:34.000Z | 2019-09-21T09:40:34.000Z | Sources/Library/quaternions.ads | ForYouEyesOnly/Space-Convoy | be4904f6a02695f7c4c5c3c965f4871cd3250003 | [
"MIT"
] | null | null | null | Sources/Library/quaternions.ads | ForYouEyesOnly/Space-Convoy | be4904f6a02695f7c4c5c3c965f4871cd3250003 | [
"MIT"
] | 1 | 2019-09-25T12:29:27.000Z | 2019-09-25T12:29:27.000Z | --
-- Jan & Uwe R. Zimmer, Australia, July 2011
--
with Real_Type; use Real_Type;
package Quaternions is
type Quaternion_Real is record
w, x, y, z : Real;
end record;
function "abs" (Quad : Quaternion_Real) return Real;
function Unit (Quad : Quaternion_Real) return Quaternion_Real;
function Conj (Quad : Quaternion_Real) return Quaternion_Real;
function "-" (Quad : Quaternion_Real) return Quaternion_Real;
function "+" (Left, Right : Quaternion_Real) return Quaternion_Real;
function "-" (Left, Right : Quaternion_Real) return Quaternion_Real;
function "*" (Left, Right : Quaternion_Real) return Quaternion_Real;
function "/" (Left, Right : Quaternion_Real) return Quaternion_Real;
function "*" (Left : Quaternion_Real; Right : Real) return Quaternion_Real;
function "/" (Left : Quaternion_Real; Right : Real) return Quaternion_Real;
function "*" (Left : Real; Right : Quaternion_Real) return Quaternion_Real;
function "/" (Left : Real; Right : Quaternion_Real) return Quaternion_Real;
function Image (Quad : Quaternion_Real) return String;
end Quaternions;
| 38.16129 | 91 | 0.683855 |
dcb9e26e236820fc4dfb295ec322319a90e3104c | 30,364 | adb | Ada | src/semantica-gci.adb | alvaromb/Compilemon | de5f88f084705868d38e301d95bb4a19a46a1156 | [
"MIT"
] | 1 | 2018-08-11T01:51:27.000Z | 2018-08-11T01:51:27.000Z | src/semantica-gci.adb | alvaromb/Compilemon | de5f88f084705868d38e301d95bb4a19a46a1156 | [
"MIT"
] | null | null | null | src/semantica-gci.adb | alvaromb/Compilemon | de5f88f084705868d38e301d95bb4a19a46a1156 | [
"MIT"
] | null | null | null | package body Semantica.Gci is
package Pila_Proc is new Pilas (Num_Proc);
use Pila_Proc;
Pproc : Pila_Proc.Pila;
package Pila_Param is new Pilas (T_Param);
use Pila_Param;
Pparam : Pila_Param.Pila;
procedure Genera
(instr : in Tinstruccio;
C1 : in Camp := Camp_Nul;
C2 : in Camp := Camp_Nul;
C3 : in Camp := Camp_Nul) is
begin
Escriure_Fitxer((instr, C1, C2, C3));
end Genera;
procedure inicia_Generacio
(Nomfitxer : in String) is
begin
if not Esem then
Crea_Fitxer(Nomfitxer);
Pila_Buida(Pproc);
Pila_Buida(Pparam);
Empilar(Pproc, Proc_Nul);
end if;
end inicia_Generacio;
procedure Gci_Programa
(A : in Pnode) is
begin
Nprofunditat := 1;
Empilar(Pproc, Proc_Nul);
Tv.Nv := Nv;
Gci_Decprocediment(A);
Calcula_Despls;
Tanca_Fitxer;
end Gci_Programa;
procedure Gci_Decprocediment
(A : in Pnode) is
Encap : Pnode renames A.Fe5;
Decls : Pnode renames A.Fc5;
Bloc : Pnode renames A.Fd5;
Id : Pnode renames A.Fid5;
Id_Proc : Id_Nom renames A.Fid5.Id12;
Eip : Num_Etiq;
C1 : Camp;
Ipr : info_Proc;
Dproc : Descrip;
Idprinvocador,
Idprinvocat,
Nproc : Num_Proc;
begin
Gci_Encap(Encap, Id_Proc);
Eip := Nova_Etiq;
Cim(Pproc, Nproc);
Dproc := Cons(Tts(Nproc), Id_Proc);
Ipr := (intern, 0, Id_Proc, Nprofunditat, 0, Eip);
Nprofunditat := Nprofunditat + 1;
Modif_Descripcio(Tp, Dproc.Np, Ipr);
if Decls.Tipus = Declaracions then
Gci_Declaracions(Decls);
end if;
C1 := (Etiq, Eip);
Genera(Etiqueta, C1);
C1:=(Proc, Dproc.Np);
Genera(Preamb, C1);
Gci_Bloc(Bloc);
Nprofunditat := Nprofunditat - 1;
--Rtn
Cim(Pproc, Idprinvocat);
C1:=(Proc, Idprinvocat);
Genera(Rtn, C1);
Desempilar(Pproc);
Cim(Pproc, Idprinvocador);
end Gci_Decprocediment;
procedure Gci_Encap
(A : in Pnode;
I : in Id_Nom) is
Dproc : Descrip;
Idproc : Num_Proc;
begin
if A.Tipus = Pencap then
Gci_Pencap(A);
else
Cim(Pproc, Idproc);
Dproc := Cons(Tts(Idproc), I);
Empilar(Pproc, Dproc.Np);
end if;
end Gci_Encap;
procedure Gci_Pencap
(A : in Pnode) is
Param : Pnode renames A.Fd1;
Fesq : Pnode renames A.Fe1;
Dproc : Descrip;
Idproc : Num_Proc;
begin
if Fesq.Tipus = Identificador then
Cim(Pproc, Idproc);
Dproc := Cons(Tts(Idproc), Fesq.Id12);
Empilar(Pproc, Dproc.Np);
Gci_Param(Param);
else
Gci_Pencap(Fesq);
Gci_Param(Param);
end if;
end Gci_Pencap;
procedure Gci_Param
(A : in Pnode) is
Idpar : Id_Nom renames A.Fe2.Id12;
D, Dtipus: Descrip;
Idproc : Num_Proc;
Iv : info_Var;
begin
Cim(Pproc, Idproc);
D := Cons(Tts(Idproc), Idpar);
case D.Td is
when Dvar =>
Dtipus:=Cons(Tts(Idproc),D.Tr);
Iv := (Idpar,
Idproc,
Dtipus.Dt.Ocup,
0,
Dtipus.Dt.Tt,
True,
False,
0);
Modif_Descripcio(Tv, D.Nv, Iv);
when Dargc =>
Dtipus:=Cons(Tts(Idproc),D.Targ);
Iv := (Idpar,
Idproc,
Dtipus.Dt.Ocup,
0,
Dtipus.Dt.Tt,
True,
False,
0);
Modif_Descripcio(Tv, D.Nvarg, Iv);
when others =>
null;
end case;
end Gci_Param;
procedure Gci_Declaracions
(A : in Pnode) is
Decl : Pnode renames A.Fd1;
Decls : Pnode renames A.Fe1;
begin
if Decls.Tipus = Declaracions then
Gci_Declaracions(Decls);
end if;
case Decl.Tipus is
when Dvariable =>
Gci_Decvar(Decl);
when Dconstant =>
Null;
when Dcoleccio =>
Gci_Deccol(Decl);
when Dregistre | Dencapregistre | Firecord =>
Null;
when Dsubrang =>
Null;
when Procediment =>
Gci_Decprocediment(Decl);
when others =>
Null;
end case;
end Gci_Declaracions;
procedure Gci_Decvar
(A : in Pnode) is
Dvariable : Pnode renames A.Fd1;
Id : Id_Nom renames A.Fe1.Id12;
Ivar : info_Var := info_Var_Nul;
Desc,Desctipus : Descrip;
Idproc : Num_Proc;
begin
Gci_Declsvar(Dvariable);
Cim(Pproc, Idproc);
Desc:= Cons(Tts(Idproc),Id);
Desctipus := Cons(Tts(Idproc),Desc.Tr);
Ivar := (Id,
Idproc,
Desctipus.Dt.Ocup,
0,
Desctipus.Dt.Tt,
False,
False,
0);
Modif_Descripcio(Tv, Desc.Nv, Ivar);
end Gci_Decvar;
procedure Gci_Declsvar
(A : in Pnode) is
Tnode : Tipusnode renames A.Tipus;
Ivar : info_Var := info_Var_Nul;
Desc,Desctipus : Descrip;
Idproc : Num_Proc;
begin
if Tnode = Declmultvar then
Gci_Declsvar(A.Fd1);
Cim(Pproc, Idproc);
Desc:= Cons(Tts(Idproc),A.Fe1.Id12);
Desctipus := Cons(Tts(Idproc),Desc.Tr);
Ivar := (A.Fe1.Id12,
Idproc,
Desctipus.Dt.Ocup,
0,
Desctipus.Dt.Tt,
False,
False,
0);
Modif_Descripcio(Tv, Desc.Nv, Ivar);
end if;
end Gci_Declsvar;
procedure Gci_Decconst
(A : in Pnode) is
Id : Id_Nom renames A.Fe2.Id12;
Val : Pnode renames A.Fd2;
Iconst : info_Var := info_Var_Nul;
Desc, Desctipus : Descrip;
Idproc : Num_Proc;
begin
Cim(Pproc, Idproc);
Desc:= Cons(Tts(Idproc),A.Fd1.Id12);
Desctipus := Cons(Tts(Idproc),Desc.Tr);
Iconst := (Id,
Idproc,
Desctipus.Dt.Ocup,
0,
Desctipus.Dt.Tt,
False,
True,
Val.Val);
Modif_Descripcio(Tv, Desc.Nv, Iconst);
end Gci_Decconst;
procedure Gci_Deccol
(A : in Pnode) is
Darray : Descrip;
Fesq : Pnode renames A.Fe1;
Idarray : Id_Nom;
Base : Valor := 0;
Idproc : Num_Proc;
T1 : Num_Var;
begin
Gci_Pcoleccio(Fesq,Base,Idarray);
Cim(Pproc, Idproc);
Darray := Cons(Tts(Idproc),Idarray);
Novaconst(Tv, Base, Tsent, Idproc, T1);
Darray.Dt.Base := Base;
Actualitza(Tts(Idproc), Idarray, Darray);
end Gci_Deccol;
procedure Gci_Pcoleccio
(A : in Pnode;
Base: in out Valor;
Idarray : out Id_Nom) is
Fesq : Pnode renames A.Fe1;
Id : Id_Nom renames A.Fd1.Id12;
Ncomp : Valor;
Dtcamp : Descrip;
Idproc : Num_Proc;
begin
Cim(Pproc, Idproc);
if (A.Tipus = Pcoleccio) then
Gci_Pcoleccio(Fesq, Base, Idarray);
Dtcamp := Cons(Tts(Idproc),Id);
Ncomp := Dtcamp.Dt.Lsup - Dtcamp.Dt.Linf + 1;
Base := (Base * Ncomp) + Dtcamp.Dt.Linf;
elsif (A.Tipus = Pdimcoleccio) then
Dtcamp := Cons(Tts(Idproc),Id);
Idarray := Fesq.Id12;
Base := Dtcamp.Dt.Linf;
end if;
end Gci_Pcoleccio;
procedure Gci_Bloc
(A : in Pnode) is
D : Descrip;
Idbase : Num_Proc;
Idtipus : Id_Nom;
Idres,
Iddesp,
Idr,
Idd: Num_Var;
begin
case (A.Tipus) is
when Bloc =>
Gci_Bloc(A.Fe1);
Gci_Bloc(A.Fd1);
when Repeticio =>
Gci_Srep(A);
when Identificador =>
Gci_Identificador(A, Idres, Iddesp, Idtipus);
when Fireferencia =>
Gci_Referencia_Proc(A, Idbase);
when Condicionals =>
Gci_Sconds(A);
when Condicionalc =>
Gci_Scondc(A);
when Assignacio =>
Gci_Referencia_Var(A.Fe1, Idr, Idd, Idtipus);
Gci_Expressio(A.Fd1, Idres, Iddesp);
Gci_Assignacio(Idr, Idd, Idres, Iddesp);
when others => null;
end case;
end Gci_Bloc;
procedure Gci_Assignacio
(Idref, Iddref, Idrexp, Iddexp: in Num_Var) is
C1,
C2,
C3,
C4,
C5 : Camp;
T : Num_Var;
Idproc : Num_Proc;
begin
C1:=(Var, Idref);
C2:=(Var, Iddref);
C3:=(Var, Idrexp);
C4:=(Var, Iddexp);
Cim(Pproc, Idproc);
if Iddref = Var_Nul then
if Iddexp = Var_Nul then
Genera(Copia, C1, C3);
else
Genera(Consindex, C1, C3, C4);
end if;
else
if Iddexp = Var_Nul then
Genera(Asigindex, C1, C2, C3);
else
Novavar(Tv, Idproc, T);
C5:=(Var, T);
Genera(Consindex, C5, C3, C4);
Genera(Asigindex, C1, C2, C5);
end if;
end if;
end Gci_Assignacio;
--Procediments
procedure Gci_Referencia_Proc
(A : in Pnode;
Idproc : out Num_Proc) is
Tipus : Tipusnode renames A.Tipus;
Dproc : Descrip;
Prm : T_Param;
C1, C2 : Camp;
begin
case Tipus is
when Identificador => --R -> Id
Idproc:= Proc_Nul;
Cim(Pproc,Idproc);
Dproc := Cons(Tts(Idproc), A.Id12);
Idproc := Dproc.Np;
when Fireferencia => -- R -> Pri)
Gci_Ref_Pri(A.F6, Idproc);
while not Es_Buida(Pparam) loop
Cim(Pparam, Prm);
C1:=(Var, Prm.Base);
C2:=(Var, Prm.Despl);
if Prm.Despl=Var_Nul then
Genera(Params, C1);
else
Genera(Paramc, C1, C2);
end if;
Desempilar(Pparam);
end loop;
C1:=(Proc, Idproc);
Genera(Call, C1);
when others =>
Put_Line("Error (Debug)");
end case;
end Gci_Referencia_Proc;
procedure Gci_Ref_Pri
(A : in Pnode;
Idproc : out Num_Proc) is
Tipus : Tipusnode renames A.Tipus;
Fesq : Pnode renames A.Fe1;
Fdret : Pnode renames A.Fd1;
Idres, Iddesp : Num_Var;
Prm: T_Param;
begin
case Tipus is
when Pri => --Pri -> Pri,E
Gci_Ref_Pri(Fesq,Idproc);
Gci_Expressio(Fdret, Idres, Iddesp);
Prm.Base := Idres;
Prm.Despl := Iddesp;
Empilar(Pparam, Prm);
when Encappri => -- Pri -> R(E
Gci_Referencia_Proc(Fesq, Idproc);
Gci_Expressio(Fdret, Idres, Iddesp);
Prm.Base := Idres;
Prm.Despl := Iddesp;
Empilar(Pparam, Prm);
when others =>
Put_Line("Error (Debug)");
end case;
end Gci_Ref_Pri;
procedure Gci_Identificador
(A : in Pnode;
Idres, Iddesp: out Num_Var;
Idtipus : out Id_Nom) is
D , Descconst: Descrip;
Id : Id_Nom renames A.Id12;
Desc : Tdescrip renames D.Td;
Idv, T1 : Num_Var := Var_Nul;
Idproc : Num_Proc := Proc_Nul;
C1, C2: Camp;
Iv : info_Var;
begin
Cim(Pproc, Idproc);
D := Cons(Tts(Idproc), Id);
case Desc is
when Dvar => -- R -> Id
Idres := D.Nv;
Iddesp := Var_Nul;
Idtipus := D.Tr;
when Dconst =>
Descconst := Cons(Tts(Idproc), D.Tc);
Iv := (Id,
Idproc,
Descconst.Dt.Ocup,
0,
Descconst.Dt.Tt,
False,
True,
D.Vc);
Modif_Descripcio(Tv, D.Nvc, Iv);
Novavar(Tv, Idproc, T1);
C1:=(Var, T1);
C2:=(Const, D.Nvc);
Genera(Copia, C1, C2);
Idres:= T1;
Iddesp:= Var_Nul;
Idtipus:= D.Tc;
when Dargc =>
Novavar(Tv, Idproc, T1);
C1:=(Var, T1);
C2:=(Var, D.Nvarg);
Genera(Copia, C1, C2);
Idres := T1;
Iddesp := Var_Nul;
Idtipus := D.Targ;
when Dproc =>
D:=Cons(Tts(Idproc), Id);
C1:=(Proc, D.Np);
Genera(Call, C1);
when others =>
Put_Line("Es Un Altre Tipus Al Gci Identificador");
end case;
end Gci_Identificador;
procedure Gci_Constant
(A : in Pnode;
Idres : out Num_Var) is
Tatr : Tipus_Atribut renames A.Tconst;
Idproc : Num_Proc;
T : Tipussubjacent;
T1 : Num_Var;
C1,
C2 : Camp;
begin
Cim(Pproc, Idproc);
case (Tatr) is
when A_Lit_C =>
T := Tscar;
when A_Lit_N =>
T := Tsent;
when A_Lit_S =>
T := Tsstr;
when others => Null;
end case;
Novaconst(Tv, A.Val, T, Idproc, T1);
Novavar(Tv, Idproc, Idres);
C1:=(Const, T1);
C2:=(Var, Idres);
Genera(Copia, C2, C1);
end Gci_Constant;
procedure Gci_Expressio
(A : in Pnode;
Idr, Idd: out Num_Var) is
Tipus : Tipusnode renames A.Tipus;
Idtipus : Id_Nom;
Desc : Descrip;
begin
Idd := Var_Nul;
case Tipus is
when Expressio =>
Gci_Expressioc(A, Idr, Idd);
when Expressiounaria =>
Gci_Expressiou(A, Idr, Idd);
when Identificador =>
Gci_Identificador(A, Idr, Idd, Idtipus);
when Const =>
Gci_Constant(A, Idr);
when Fireferencia | Referencia =>
Gci_Referencia_Var(A, Idr, Idd, Idtipus);
when others =>
Put_Line("Error (Debug)");
end case;
end Gci_Expressio;
procedure Gci_Expressioc
(A : in Pnode;
Idres,Idresdesp: out Num_Var) is
Fesq : Pnode renames A.Fe3;
Fdret : Pnode renames A.Fd3;
Op : Operacio renames A.Op3;
Idesq,
Iddret,
Iddespe,
Iddespd : Num_Var;
begin
--Analitzam L'Operand Esquerra
Gci_Expressio(Fesq, Idesq,Iddespe);
--Analitzam L'Operand Dret
Gci_Expressio(Fdret, Iddret,Iddespd);
-- Comparam Els Tipus
case Op is
when Unio | interseccio =>
Gci_Exp_Logica(Idesq, Iddret, Iddespe,
Iddespd, Idres, Idresdesp, Op);
when Menor | Menorig | Major | Majorig
| Igual | Distint =>
Gci_Exp_Relacional(Idesq, Iddret, Iddespe,
Iddespd, Idres, Idresdesp, Op);
when Suma | Resta | Mult | Div | Modul =>
Gci_Exp_Aritmetica(Idesq, Iddret, Iddespe,
Iddespd, Idres, Idresdesp, Op);
when others =>
Null;
end case;
end Gci_Expressioc;
procedure Gci_Exp_Relacional
(Idrese, Idresd, Iddespe, Iddespd : in Num_Var;
Idresultexp, Iddespexp : out Num_Var;
Op : in Operacio) is
T1,
T2,
T3 : Num_Var := Var_Nul;
Emig,
Efi : Num_Etiq;
C1,
C2,
C3 : Camp;
Idproc : Num_Proc := Proc_Nul;
begin
if Iddespe = Var_Nul then
T1:= Idrese;
else
Cim(Pproc, Idproc);
Novavar(Tv, Idproc, T1);
C1:=(Var, T1);
C2:=(Var, Idrese);
C3:=(Var, Iddespe);
Genera(Consindex,C1,C2,C3);
end if;
if Iddespd = Var_Nul then
T2 := Idresd;
else
Cim(Pproc, Idproc);
Novavar(Tv, Idproc, T2);
C1:=(Var, T2);
C2:=(Var, Idresd);
C3:=(Var, Iddespd);
Genera(Consindex,C1,C2,C3);
end if;
Emig:=Nova_Etiq;
Efi:=Nova_Etiq;
C1:=(Var, T1);
C2:=(Var, T2);
C3:=(Etiq, Emig);
case Op is
when Menor => Genera(Menor, C1, C2, C3);
when Menorig => Genera(Menorigual, C1, C2, C3);
when Igual => Genera(Igual,C1,C2,C3);
when Majorig => Genera(Majorigual, C1, C2, C3);
when Major => Genera(Major, C1, C2, C3);
when Distint => Genera(Diferent, C1, C2, C3);
when others => Null;
end case;
Cim(Pproc, Idproc);
Novavar(Tv, Idproc, T3);
C1 := (Var, T3 );
C2 := (Const, Zero);
Genera(Copia, C1, C2);
C3 := (Etiq, Efi);
Genera(Branc_inc, C3);
C3.Ide := Emig;
Genera(Etiqueta, C3);
C2.Idc := Menysu;
Genera(Copia, C1, C2);
C3.Ide := Efi;
Genera(Etiqueta, C3);
Idresultexp := T3;
Iddespexp := Var_Nul;
end Gci_Exp_Relacional;
procedure Gci_Exp_Logica
(Idrese, Idresd, Iddespe, Iddespd : in Num_Var;
Idresultexp, Iddespexp : out Num_Var;
Op : in Operacio) Is
T1,
T2,
T3 : Num_Var := Var_Nul;
C1,
C2,
C3 : Camp;
Idproc : Num_Proc := Proc_Nul;
begin
if Iddespe = Var_Nul then
T1:= Idrese;
else
Cim(Pproc, Idproc);
Novavar(Tv, Idproc, T1);
C1 := (Var, T1);
C2 := (Var, Idrese);
C3 := (Var, Iddespe);
Genera(Consindex,C1,C2,C3);
end if;
if Iddespd = Var_Nul then
T2 := Idresd;
else
Cim(Pproc, Idproc);
Novavar(Tv, Idproc, T2);
C1 := (Var, T2);
C2 := (Var, Idresd);
C3 := (Var, Iddespd);
Genera(Consindex, C1, C2, C3);
end if;
Cim(Pproc, Idproc);
Novavar(Tv, Idproc, T3);
C1 := (Var, T3);
C2 := (Var, T1);
C3 := (Var, T2);
case Op is
when Unio => Genera(Op_Or,C1,C2,C3);
when interseccio => Genera(Op_And,C1,C2,C3);
when others => Null;
end case;
Idresultexp := T3;
Iddespexp := Var_Nul;
end Gci_Exp_Logica;
procedure Gci_Exp_Aritmetica
(Idrese, Idresd, Iddespe, Iddespd : in Num_Var;
Idresultexp, Iddespexp : out Num_Var;
Op : in Operacio) is
T1,
T2,
T3 : Num_Var := Var_Nul;
C1,
C2,
C3 : Camp;
Idproc : Num_Proc := Proc_Nul;
begin
if Iddespe = Var_Nul then
T1:= Idrese;
else
Cim(Pproc, Idproc);
Novavar(Tv, Idproc, T1);
C1 := (Var, T1);
C2 := (Var, Idrese);
C3 := (Var, Iddespe);
Genera(Consindex,C1,C2,C3);
end if;
if Iddespd = Var_Nul then
T2 := Idresd;
else
Cim(Pproc, Idproc);
Novavar(Tv, Idproc, T2);
C1 := (Var, T2);
C2 := (Var, Idresd);
C3 := (Var, Iddespd);
Genera(Consindex,C1,C2,C3);
end if;
Cim(Pproc, Idproc);
Novavar(Tv, Idproc, T3);
C1 := (Var, T3);
C2:=(Var, T1);
C3:=(Var, T2);
case Op is
when Suma => Genera(Suma, C1, C2, C3);
when Resta => Genera(Resta, C1, C2, C3);
when Mult => Genera(Producte, C1, C2, C3);
when Div => Genera(Divisio, C1, C2, C3);
when Modul => Genera(Modul, C1, C2, C3);
when others => Null;
end case;
Idresultexp := T3;
Iddespexp := Var_Nul;
end Gci_Exp_Aritmetica;
procedure Gci_Expressiou
(A : in Pnode;
Idr, Idd : out Num_Var) is
Fdret : Pnode renames A.F4;
Op : Operacio renames A.Op4;
Idru, Iddu : Num_Var;
begin
Gci_Expressio(Fdret, Idru, Iddu);
case Op is
when Resta =>
Gci_Exp_Negacio(Idru, Iddu, Idr, Idd);
when Negacio =>
Gci_Exp_Neglogica(Idru, Iddu, Idr, Idd);
when others =>
Null;
end case;
end Gci_Expressiou;
procedure Gci_Exp_Negacio
(Idres, Iddesp : in Num_Var;
Idresultexp, Iddespexp : out Num_Var) is
T1,
T2 : Num_Var := Var_Nul;
C1,
C2,
C3 : Camp;
Idproc : Num_Proc := Proc_Nul;
begin
Cim(Pproc, Idproc);
if Iddesp = Var_Nul then
T1:= Idres;
else
Novavar(Tv, Idproc, T1);
C1 := (Var, T1);
C2 := (Var, Idres);
C3 := (Var, Iddesp);
Genera(Consindex, C1, C2, C3);
end if;
Novavar(Tv, Idproc, T2);
C1 := (Var, T2);
C2 := (Var, T1);
Genera(Negacio, C1, C2);
Idresultexp := T2;
Iddespexp := Var_Nul;
end Gci_Exp_Negacio;
procedure Gci_Exp_Neglogica
(Idres, Iddesp : in Num_Var;
Idresultexp, Iddespexp : out Num_Var) is
T1,
T2 : Num_Var := Var_Nul;
C1,
C2,
C3 : Camp;
Idproc : Num_Proc := Proc_Nul;
begin
Cim(Pproc, Idproc);
if Iddesp = Var_Nul then
T1:= Idres;
else
Novavar(Tv, Idproc, T1);
C1 := (Var, T1);
C2 := (Var, Idres);
C3 := (Var, Iddesp);
Genera(Consindex, C1, C2, C3);
end if;
Novavar(Tv, Idproc, T2);
C1 := (Var, T2);
C2 := (Var, T1);
Genera(Op_Not, C1, C2);
Idresultexp := T2;
Iddespexp := Var_Nul;
end Gci_Exp_Neglogica;
procedure Gci_Referencia_Var
(A : in Pnode;
Idres, Iddesp: out Num_Var;
Idtipus : out Id_Nom) is
Tipus : Tipusnode renames A.Tipus;
Idbase : Num_Var;
It_Idx : Cursor_Idx;
Da, Dtc : Descrip;
T1,T2,T3,T4,T5,T6,T7: Num_Var := Var_Nul;
Idproc : Num_Proc := Proc_Nul;
C1, C2, C3: Camp;
begin
case Tipus is
when Identificador =>
Gci_Identificador(A, Idres, Iddesp, Idtipus);
when Referencia => -- R -> R.Id
Gci_Ref_Rec(A, Idres, Iddesp, Idtipus);
when Fireferencia => --R -> Ref_Pri)
Gci_Ref_Pri(A.F6, Idres, Iddesp, Idbase,
Idtipus, It_Idx);
Cim(Pproc, Idproc);
Dtc := Cons(Tts(Idproc),Idtipus);
Idtipus := Dtc.Dt.Tcamp;
Novavar(Tv,Idproc, T7);
Novaconst(Tv, Valor(Dtc.Dt.Base), Tsent,
Idproc, T3);
C1 := (Var, T7);
C2 := (Var, Iddesp);
C3 := (Const, T3);
Genera(Resta, C1, C2, C3);
Novavar(Tv, Idproc, T1);
Novaconst(Tv, Valor(integer'Size/8), Tsent,
Idproc, T6);
C1 := (Var, T1);
C2 := (Var, T7);
C3 := (Const, T6);
Genera(Producte, C1, C2, C3);
Novavar(Tv, Idproc, T2);
if Idbase = Var_Nul then
Iddesp := T1;
else
Novavar(Tv, Idproc, T4);
Novaconst(Tv, Valor(Dtc.Dt.Ocup), Tsent,
Idproc, T5);
C1 := (Var, T4);
C2 := (Const, T5);
C3 := (Var, T2);
Genera(Suma, C1, C2, C3);
end if;
when others => Null;
end case;
end Gci_Referencia_Var;
--Arrays
procedure Gci_Ref_Pri
(A : in Pnode;
Idres, Iddesp, Idbase : out Num_Var;
Idtipus : out Id_Nom;
It_Idx : out Cursor_Idx) is
Tipus : Tipusnode renames A.Tipus;
Fesq : Pnode renames A.Fe1;
Fdret : Pnode renames A.Fd1;
Idrese, Iddespe : Num_Var := Var_Nul;
T0,T1,T2,T3 : Num_Var := Var_Nul;
C1, C2, C3 : Camp;
Idproc : Num_Proc := Proc_Nul;
Di : Id_Nom;
Dti: Descrip;
Ni : Valor;
begin
case Tipus is
when Pri => --Pri -> Pri, E
Cim(Pproc, Idproc);
Gci_Ref_Pri(Fesq, Idres, Iddesp, Idbase,
Idtipus, It_Idx);
Gci_Expressio(Fdret, Idrese, Iddespe);
It_Idx := Succ_Idx(Tts(Idproc), It_Idx);
Di := Cons_Idx(Tts(Idproc), It_Idx);
Dti := Cons(Tts(Idproc),Di);
Ni := Dti.Dt.Lsup - Dti.Dt.Linf + 1;
Novaconst(Tv, Ni, Tsent, Idproc, T0);
Novavar(Tv, Idproc, T1);
C1 := (Var, T1);
C2 := (Var, Iddesp);
C3 := (Const, T0);
Genera(Producte, C1, C2, C3);
Novavar(Tv, Idproc, T2);
if Iddespe = Var_Nul then
C1 := (Var, T2);
C2 := (Var, T1);
C3 := (Var, Idrese);
Genera(Suma, C1, C2, C3);
else
C1 := (Var, T3);
C2 := (Var, Idrese);
C3 := (Var, Iddespe);
Genera(Suma, C1, C2, C3);
C1 := (Var, T2);
C2 := (Var, T1);
C3 := (Var, T3);
Genera(Suma, C1, C2, C3);
end if;
Iddesp := T2;
when Encappri => -- Encappri --> R(E
Cim(Pproc, Idproc);
Gci_Referencia_Var(Fesq, Idres, Idbase,
Idtipus);
Gci_Expressio(Fdret, Idrese, Iddespe);
It_Idx := Primer_Idx(Tts(Idproc), Idtipus);
if Iddespe = Var_Nul then
Iddesp:= Idrese;
else
Novavar(Tv, Idproc, T1);
C1:=(Var, T1);
C2:=(Var, Idrese);
C3:=(Var, Iddespe);
Genera(Suma, C1, C2, C3);
Iddesp:=T1;
end if;
when others =>
Put_Line("Error (Debug)");
end case;
end Gci_Ref_Pri;
procedure Gci_Ref_Rec
(A : in Pnode;
Idres, Iddesp: out Num_Var;
Idtipus : out Id_Nom) is
Fesq : Pnode renames A.Fe1;
Dcmp : Descrip;
Dtcamp : Descrip;
Idcamp : Id_Nom renames A.Fd1.Id12;
Numconstant : Num_Var := Var_Nul;
T1 :Num_Var := Var_Nul;
C1,
C2,
C3 : Camp;
Dtipus_Camp : Descrip;
Idproc : Num_Proc;
begin
Gci_Referencia_Var(Fesq, Idres, Iddesp,
Idtipus);
Cim(Pproc, Idproc);
Dcmp := Conscamp(Tts(Idproc), Idtipus,
Idcamp);
Idtipus:= Dcmp.Tcamp;
Dtipus_Camp := Cons(Ts, Idtipus);
Novaconst(Tv, Valor(Dcmp.Dsp*4),
Tsent, Idproc, Numconstant);
if Iddesp = Var_Nul then
Iddesp:=Numconstant;
else
Novavar(Tv, Idproc, T1);
C1:=(Var, T1);
C2:=(Var, Iddesp);
C3:=(Const, Numconstant);
Genera (Suma, C1, C2, C3);
Iddesp:= T1;
end if;
end Gci_Ref_Rec;
procedure Gci_Sconds
(A : in Pnode) is
Cond : Pnode renames A.Fe1;
Bloc : Pnode renames A.Fd1;
Idres, Iddesp : Num_Var;
C1, C2, C3 : Camp;
Efals: Num_Etiq;
Idproc : Num_Proc;
T1 : Num_Var := Var_Nul;
begin
Efals := Nova_Etiq;
Gci_Expressio(Cond, Idres, Iddesp);
if Iddesp = Var_Nul then
C2 := (Var, Idres);
else
Cim(Pproc, Idproc);
Novavar(Tv, Idproc, T1);
C1 := (Var, T1);
C2 := (Var, Idres);
C3 := (Var, Iddesp);
Genera(Consindex, C1, C2, C3);
C2 := (Var, T1);
end if;
C3 := (Etiq, Efals);
C1 := (Const, Zero);
Genera(Igual, C2, C1, C3);
Gci_Bloc(Bloc);
Genera(Etiqueta, C3);
end Gci_Sconds;
procedure Gci_Scondc
(A : in Pnode) is
Cond : Pnode renames A.Fe2;
Bloc : Pnode renames A.Fc2;
Blocelse : Pnode renames A.Fd2;
Idres, Iddesp : Num_Var;
C1, C2, C3 : Camp;
Efals, Efinal: Num_Etiq;
Idproc : Num_Proc;
T1 : Num_Var := Var_Nul;
begin
Efals := Nova_Etiq;
Efinal := Nova_Etiq;
Gci_Expressio(Cond, Idres, Iddesp);
if Iddesp = Var_Nul then
C2 := (Var, Idres);
else
Cim(Pproc, Idproc);
Novavar(Tv, Idproc, T1);
C1 := (Var, T1);
C2 := (Var, Idres);
C3 := (Var, Iddesp);
Genera(Consindex, C1, C2, C3);
C2 := (Var, T1);
end if;
C3 := (Etiq, Efals);
C1 := (Const, Zero);
Genera(Igual, C2, C1, C3);
Gci_Bloc(Bloc);
C1 := (Etiq, Efinal);
Genera(Branc_inc, C1);
C1.Ide:=Efals;
Genera(Etiqueta, C1);
Gci_Bloc(Blocelse);
C1 := (Etiq, Efinal);
Genera(Etiqueta, C1);
end Gci_Scondc;
procedure Gci_Srep
(A : in Pnode) is
Exp : Pnode renames A.Fe1;
Bloc : Pnode renames A.Fd1;
Idres, Iddesp : Num_Var;
C1, C2, C3 : Camp;
Einicial, Efinal: Num_Etiq;
Idproc : Num_Proc;
T1 : Num_Var := Var_Nul;
begin
Einicial := Nova_Etiq;
Efinal := Nova_Etiq;
C1 := (Etiq, Einicial);
Genera(Etiqueta, C1);
Gci_Expressio(Exp, Idres, Iddesp);
C1 := (Etiq, Efinal);
if Iddesp = Var_Nul then
C2 := (Var, Idres);
else
Cim(Pproc, Idproc);
Novavar(Tv, Idproc, T1);
C1 := (Var, T1);
C2 := (Var, Idres);
C3 := (Var, Iddesp);
Genera(Consindex, C1, C2, C3);
C2 := (Var, T1);
end if;
C3 := (Const, Zero);
Genera(Igual, C2, C3, C1);
Gci_Bloc(Bloc);
C1 := (Etiq, Einicial);
Genera(Branc_inc, C1);
C1.Ide := Efinal;
Genera(Etiqueta, C1);
end Gci_Srep;
-- Calcula Desplacaments
procedure Calcula_Despls is
Idpr : Num_Proc;
Ocup_Var : Despl;
begin
for P in Num_Proc loop
if Tp.Tp(P).Tp = intern then
Tp.Tp(P).Ocup_Var := 0;
end if;
end loop;
for V in Num_Var range 1..Tv.Nv loop
if Tv.Tv(V).Param then
Idpr := Tv.Tv(V).Np;
if Tp.Tp(Idpr).Tp = intern then
Tv.Tv(V).Desp := Tp.Tp(Idpr).Ocup_Param + 12;
Tp.Tp(Idpr).Ocup_Param :=
Despl(Tp.Tp(Idpr).Ocup_Param) + 4;
end if;
else
Idpr := Tv.Tv(V).Np;
if Tp.Tp(Idpr).Tp = intern then
Ocup_Var := Tv.Tv(V).Ocup;
Tp.Tp(Idpr).Ocup_Var :=
Tp.Tp(Idpr).Ocup_Var + Ocup_Var;
Tv.Tv(V).Desp :=
Despl(Tp.Tp(Idpr).Ocup_Var* (-1));
end if;
end if;
end loop;
end Calcula_Despls;
end Semantica.Gci;
| 23.871069 | 63 | 0.495027 |
23027d9b9b4217c9639a6daf914694da2ccc0cb0 | 11,380 | adb | Ada | linear_algebra/banded_lu_demo_1.adb | jscparker/math_packages | b112a90338014d5c2dfae3f7265ee30841fb6cfd | [
"ISC",
"MIT"
] | 30 | 2018-12-09T01:15:04.000Z | 2022-03-20T16:14:54.000Z | linear_algebra/banded_lu_demo_1.adb | jscparker/math_packages | b112a90338014d5c2dfae3f7265ee30841fb6cfd | [
"ISC",
"MIT"
] | null | null | null | linear_algebra/banded_lu_demo_1.adb | jscparker/math_packages | b112a90338014d5c2dfae3f7265ee30841fb6cfd | [
"ISC",
"MIT"
] | null | null | null |
-- Tests LU decomposition on a real valued banded matrix.
--
-- Shows how interative refinement can clean up the mess when no
-- pivoting is used in LU decomposition. Also shows that iterative
-- refinement is ineffective if the problem is ill-conditioned.
-- (Pivoting doesn't solve the problem of ill-conditioning either.)
with Banded_LU;
With Text_IO; use Text_IO;
procedure banded_lu_demo_1 is
type Real is digits 15;
-- Create a data structure for making banded matrices.
No_Of_Off_Diagonals : constant Integer := 20; -- if 1, it's tri-diagonal
Max_Size_Of_Matrix : constant Integer := 150;
package lu is new Banded_LU (Real, Max_Size_Of_Matrix, No_Of_Off_Diagonals);
use lu;
package rio is new Float_IO(Real);
use rio;
package iio is new Integer_IO(Integer);
use iio;
type Matrix is array(Index) of Column; -- not type Banded_Matrix
Starting_Index : constant Index := Index'First + 10;
Max_Index : constant Index := Index'Last - 10;
C_band : Banded_Matrix := (others => (others => 0.0)); -- exported by LU
C_full : Matrix := (others => (others => 0.0));
C_Inverse : Matrix := (others => (others => 0.0));
No_Of_Iterations : Integer := 0;
Off_Factor : Real;
Sum, Del, Error_Off_Diag, Error_Diag, Max_Error : Real;
-----------
-- Pause --
-----------
procedure Pause (s1,s2,s3,s4,s5,s6,s7,s8,s9 : string := "") is
Continue : Character := ' ';
begin
new_line;
if S1 /= "" then put_line (S1); end if;
if S2 /= "" then put_line (S2); end if;
if S3 /= "" then put_line (S3); end if;
if S4 /= "" then put_line (S4); end if;
if S5 /= "" then put_line (S5); end if;
if S6 /= "" then put_line (S6); end if;
if S7 /= "" then put_line (S7); end if;
if S8 /= "" then put_line (S8); end if;
if S9 /= "" then put_line (S9); end if;
new_line(1);
begin
put ("Type a character to continue: ");
get_Immediate (Continue);
new_line(1);
exception
when others => null;
end;
end pause;
------------
-- Invert --
------------
-- Get Inverse of the Matrix:
procedure Invert
(M : in Banded_Matrix;
M_Inv : out Matrix;
Max_Index : in Index;
Starting_Index : in Index;
Max_Error : out Real;
No_Of_Iterations : in Integer)
is
Unit_Vector, Solution_Vector, Error, Diag_Inverse : Column;
Zero_Vector : constant Column := (others => 0.0);
M_LU : Banded_Matrix := M;
begin
Max_Error := 0.0;
LU_decompose (M_LU, Diag_Inverse, Max_Index, Starting_Index);
for I in Starting_Index..Max_Index loop
Unit_Vector := Zero_Vector;
Unit_Vector(I) := 1.0;
--Solve(Solution_Vector, Unit_Vector, M_LU, Diag_Inverse, M,
-- Max_Index, Starting_Index);
Refine_Solution
(Solution_Vector, Unit_Vector, M_LU, Diag_Inverse, M,
No_Of_Iterations, Max_Index, Starting_Index);
Error := Product (M, Solution_Vector, Max_Index, Starting_Index);
for J in Starting_Index .. Max_Index loop
Error (J) := Error(J) - Unit_Vector(J);
end loop;
for I in Starting_Index .. Max_Index loop
if Abs(Error(I)) > Max_Error then
Max_Error := Abs(Error(I));
end if;
end loop;
-- Solution vector is the I-th column of M_Inverse:
for J in Starting_Index .. Max_Index loop
M_Inv (J)(I) := Solution_Vector(J);
end loop;
end loop;
end Invert;
-------------------------------------
-- Test_Inversion_On_Banded_Matrix --
-------------------------------------
procedure Test_Inversion_On_Banded_Matrix
(Off_Factor : in Real;
No_Of_Iterations : in Integer)
is
begin
-- construct matrix.
C_band := (others => (others => 0.0));
C_full := (others => (others => 0.0));
for I in Index loop
C_band(I)(0) := 1.01010101010;
C_full(I)(I) := C_band(I)(0);
end loop;
for Diagonal in Diag_Index'First .. -1 loop
for Row in Index'First - Diagonal .. Index'Last loop
C_full(Row)(Diagonal + Row)
:= 0.033 * Real(Row) / Real(Index'Last)
+ Off_Factor / Abs Real(Diagonal);
C_band(Row)(Diagonal)
:= 0.033 * Real(Row) / Real(Index'Last)
+ Off_Factor / Abs Real(Diagonal);
end loop;
end loop;
for Diagonal in 1 .. Diag_Index'Last loop
for Row in Index'First .. Index'Last - Diagonal loop
C_full(Row)(Diagonal + Row)
:= 0.013 * Real(Row) / Real(Index'Last)
+ Off_Factor / Abs Real(Diagonal) + 0.3;
C_band(Row)(Diagonal)
:= 0.013 * Real(Row) / Real(Index'Last)
+ Off_Factor / Abs Real(Diagonal) + 0.3;
end loop;
end loop;
-- Test Matrix_Val procedure:
for Row in Index loop
for Col in Index loop
if Abs (C_full(Row)(Col) - Matrix_Val (C_band, Row, Col)) > 1.0e14 then
put_line("Some error in procedure Matrix_Val or ... ");
end if;
end loop;
end loop;
-- Construct inverse of C_band:
Invert (C_band, C_Inverse, Max_Index, Starting_Index, Max_Error, No_Of_Iterations);
pause("We just took the matrix inverse. Error estimate follows.");
new_line(2);
put ("Max Error according to Residual function is: "); put (Max_Error);
new_line;
-- Multiply Original C_band and C_Inverse as test. Get Max error:
Error_Off_Diag := 0.0;
Error_Diag := 0.0;
for I in Starting_Index..Max_Index loop
for J in Starting_Index..Max_Index loop
Sum := 0.0;
for K in Starting_Index..Max_Index loop
Sum := Sum + C_Inverse(I)(k) * C_full(k)(J);
end loop;
-- Product(I,J) := Sum;
-- The product should be the unit matrix. Calculate the error:
if I = J then
Del := Abs (Sum - 1.0);
if Del > Error_Diag then
Error_Diag := Del;
end if;
else
Del := Abs (Sum);
if Del > Error_Off_Diag then
Error_Off_Diag := Del;
end if;
end if;
end loop;
end loop;
pause
("We just took the product the inverse matrix with the original,",
"matrix and then calculated the difference between this product",
"and the unit matrix. The error is printed below.");
new_line;
put("Max error along diagonals of product: "); put(Error_Diag);
new_line;
put("Max error along off-diagonals of product: "); put(Error_Off_Diag);
new_line;
-- Multiply Original C and C_Inverse as test. Get Max error:
Error_Off_Diag := 0.0;
Error_Diag := 0.0;
for I in Starting_Index..Max_Index loop
for J in Starting_Index..Max_Index loop
Sum := 0.0;
for K in Starting_Index..Max_Index loop
Sum := Sum + C_full(I)(K) * C_Inverse(K)(J);
end loop;
-- Product(I,J) := Sum;
-- The product should be the unit matrix. Calculate the error:
if I = J then
Del := Abs (Sum - 1.0);
if Del > Error_Diag then
Error_Diag := Del;
end if;
ELSE
Del := Abs (Sum);
if Del > Error_Off_Diag then
Error_Off_Diag := Del;
end if;
end if;
end loop;
end loop;
pause
("We just took the product the original matrix with the inverse matrix,",
"and then calculated the difference between this product and",
"the unit matrix. The error is printed below.");
new_line;
put("Max error along diagonals of product: "); put(Error_Diag);
new_line;
put("Max error along off-diagonals of product: "); put(Error_Off_Diag);
new_line;
end Test_Inversion_On_Banded_Matrix;
begin
--put("Input Size Of Matrix To Invert (enter an Integer)"); new_line;
--get(IO_Max_Index);
--Max_Index := Index'First + Index (IO_Max_Index-1);
pause
("The first example demonstrates LU decomposition and inversion of",
"of a diagonally dominant matrix. The off-diagonals of the matrix",
"are all multiplied by 0.5 to make them fall off fast enough for",
"diagonal dominance (i.e. Off_Factor = 0.5). No iterative refinement",
"is done. (i.e. No_Of_Iterations = 0).");
Off_Factor := 0.5;
No_Of_Iterations := 0;
Test_Inversion_On_Banded_Matrix (Off_Factor, No_Of_Iterations);
pause
("The 2nd example demonstrates LU decomposition and inversion of",
"a non-diagonally dominant matrix. The off-diagonals of the matrix",
"are all multiplied by 10_000_000_000.0 to make them far greater in value",
"than the diagonal (i.e. Off_Factor = 1.0e10). No iterative refinement",
"is done. (i.e. No_Of_Iterations = 0). A large amount of error should",
"be evident.");
Off_Factor := 10_000_000_000.0;
No_Of_Iterations := 0;
Test_Inversion_On_Banded_Matrix (Off_Factor, No_Of_Iterations);
pause
("The 3rd example demonstrates LU decomposition and inversion of",
"a non-diagonally dominant matrix along with iterative refinement. The",
"off-diagonals of the matrix are again multiplied by 1.0e10 to make",
"them far greater in value than the diagonal.",
"Two iterations of the iterative refinement procedure are performed. ",
"(i.e. No_Of_Iterations = 2). Error should be greatly reduced.");
Off_Factor := 10_000_000_000.0;
No_Of_Iterations := 2;
Test_Inversion_On_Banded_Matrix (Off_Factor, No_Of_Iterations);
pause
("The 4rth example demonstrates LU decomposition and inversion of",
"of a non-diagonally dominant matrix which is mildly ill-conditioned.",
"The off-diagonals of the matrix are multiplied by 0.8.",
"No iterative refinement is performed. (i.e. No_Of_Iterations = 0).",
"Large error should be evident.");
Off_Factor := 0.8;
No_Of_Iterations := 0;
Test_Inversion_On_Banded_Matrix (Off_Factor, No_Of_Iterations);
pause
("The final example demonstrates LU decomposition and inversion of",
"of a mildly ill-conditioned matrix along with iterative refinement.",
"The off-diagonals of the matrix are again multiplied by 0.8.",
"Iterative refinement is performed. (i.e. No_Of_Iterations = 1).",
"No amount of iterative refinement helps much here.");
Off_Factor := 0.8;
No_Of_Iterations := 1;
Test_Inversion_On_Banded_Matrix (Off_Factor, No_Of_Iterations);
new_line(2);
put ("Choose your own values for Off_Factor and No_Of_Iterations.");
new_line(2);
put ("Input factor for scaling the off diagonals (e.g. 1.0e13):");
get(Off_Factor);
new_line;
put("Input number of iterative refinements of the solution (e.g. 4):");
get(No_Of_Iterations);
new_line;
Test_Inversion_On_Banded_Matrix (Off_Factor, No_Of_Iterations);
end;
| 32.056338 | 88 | 0.596309 |
20e3d69e7a7ca8264e67edfd3408f074f9dc4c8b | 3,292 | adb | Ada | source/nodes/program-nodes-identifiers.adb | optikos/oasis | 9f64d46d26d964790d69f9db681c874cfb3bf96d | [
"MIT"
] | null | null | null | source/nodes/program-nodes-identifiers.adb | optikos/oasis | 9f64d46d26d964790d69f9db681c874cfb3bf96d | [
"MIT"
] | null | null | null | source/nodes/program-nodes-identifiers.adb | 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
-------------------------------------------------------------
package body Program.Nodes.Identifiers is
function Create
(Identifier_Token : not null Program.Lexical_Elements
.Lexical_Element_Access)
return Identifier is
begin
return Result : Identifier :=
(Identifier_Token => Identifier_Token, Enclosing_Element => null)
do
Initialize (Result);
end return;
end Create;
function Create
(Is_Part_Of_Implicit : Boolean := False;
Is_Part_Of_Inherited : Boolean := False;
Is_Part_Of_Instance : Boolean := False)
return Implicit_Identifier is
begin
return Result : Implicit_Identifier :=
(Is_Part_Of_Implicit => Is_Part_Of_Implicit,
Is_Part_Of_Inherited => Is_Part_Of_Inherited,
Is_Part_Of_Instance => Is_Part_Of_Instance, Enclosing_Element => null)
do
Initialize (Result);
end return;
end Create;
overriding function Identifier_Token
(Self : Identifier)
return not null Program.Lexical_Elements.Lexical_Element_Access is
begin
return Self.Identifier_Token;
end Identifier_Token;
overriding function Image (Self : Identifier) return Text is
begin
return Self.Identifier_Token.Image;
end Image;
overriding function Is_Part_Of_Implicit
(Self : Implicit_Identifier)
return Boolean is
begin
return Self.Is_Part_Of_Implicit;
end Is_Part_Of_Implicit;
overriding function Is_Part_Of_Inherited
(Self : Implicit_Identifier)
return Boolean is
begin
return Self.Is_Part_Of_Inherited;
end Is_Part_Of_Inherited;
overriding function Is_Part_Of_Instance
(Self : Implicit_Identifier)
return Boolean is
begin
return Self.Is_Part_Of_Instance;
end Is_Part_Of_Instance;
overriding function Image (Self : Implicit_Identifier) return Text is
pragma Unreferenced (Self);
begin
return "";
end Image;
procedure Initialize (Self : aliased in out Base_Identifier'Class) is
begin
null;
end Initialize;
overriding function Is_Identifier_Element
(Self : Base_Identifier)
return Boolean is
pragma Unreferenced (Self);
begin
return True;
end Is_Identifier_Element;
overriding function Is_Expression_Element
(Self : Base_Identifier)
return Boolean is
pragma Unreferenced (Self);
begin
return True;
end Is_Expression_Element;
overriding procedure Visit
(Self : not null access Base_Identifier;
Visitor : in out Program.Element_Visitors.Element_Visitor'Class) is
begin
Visitor.Identifier (Self);
end Visit;
overriding function To_Identifier_Text
(Self : aliased in out Identifier)
return Program.Elements.Identifiers.Identifier_Text_Access is
begin
return Self'Unchecked_Access;
end To_Identifier_Text;
overriding function To_Identifier_Text
(Self : aliased in out Implicit_Identifier)
return Program.Elements.Identifiers.Identifier_Text_Access is
pragma Unreferenced (Self);
begin
return null;
end To_Identifier_Text;
end Program.Nodes.Identifiers;
| 27.663866 | 79 | 0.699878 |
201d38c118bd5591c2bf08915a7bc68457c3f86d | 1,474 | ads | Ada | resources/scripts/api/recondev.ads | marcostolosa/Amass | 7a48ddae82eeac76fd6447de908f6b27002eace7 | [
"Apache-2.0"
] | 7,053 | 2018-07-13T09:40:12.000Z | 2022-03-31T15:26:10.000Z | resources/scripts/api/recondev.ads | marcostolosa/Amass | 7a48ddae82eeac76fd6447de908f6b27002eace7 | [
"Apache-2.0"
] | 624 | 2018-07-17T12:01:23.000Z | 2022-03-28T13:59:17.000Z | resources/scripts/api/recondev.ads | marcostolosa/Amass | 7a48ddae82eeac76fd6447de908f6b27002eace7 | [
"Apache-2.0"
] | 1,470 | 2018-07-17T06:01:21.000Z | 2022-03-31T18:02:17.000Z | -- Copyright 2017-2021 Jeff Foley. All rights reserved.
-- Use of this source code is governed by Apache 2 LICENSE that can be found in the LICENSE file.
local json = require("json")
name = "ReconDev"
type = "api"
function start()
set_rate_limit(5)
end
function check()
local c
local cfg = datasrc_config()
if cfg ~= nil then
c = cfg.credentials
end
if (c ~= nil and c.key ~= nil and c.key ~= "") then
return true
end
return false
end
function vertical(ctx, domain)
local c
local cfg = datasrc_config()
if cfg ~= nil then
c = cfg.credentials
end
if (c == nil or c.key == nil or c.key == "") then
return
end
local resp, err = request(ctx, {['url']=build_url(domain, c.key)})
if (err ~= nil and err ~= "") then
log(ctx, "vertical request to service failed: " .. err)
return
end
local data = json.decode(resp)
if (data == nil or #data == 0) then
return
end
for i, set in pairs(data) do
local domains = set["rawDomains"]
if domains ~= nil and #domains > 0 then
for _, name in pairs(domains) do
new_name(ctx, name)
end
end
local addr = set["rawIp"]
if addr ~= nil then
new_addr(ctx, addr, domain)
end
end
end
function build_url(domain, key)
return "https://recon.dev/api/search?key=" .. key .. "&domain=" .. domain
end
| 22.333333 | 97 | 0.572592 |
20112d23c5cd5561db7e1309722c2a12cba80b90 | 237 | ads | Ada | gcc-gcc-7_3_0-release/gcc/testsuite/gnat.dg/enum2_pkg.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/testsuite/gnat.dg/enum2_pkg.ads | best08618/asylo | 5a520a9f5c461ede0f32acc284017b737a43898c | [
"Apache-2.0"
] | null | null | null | gcc-gcc-7_3_0-release/gcc/testsuite/gnat.dg/enum2_pkg.ads | best08618/asylo | 5a520a9f5c461ede0f32acc284017b737a43898c | [
"Apache-2.0"
] | 2 | 2020-07-27T00:22:36.000Z | 2021-04-01T09:41:02.000Z | with Ada.Finalization; use Ada.Finalization;
package Enum2_Pkg is
type F_String is new Controlled with record
Data : access String;
end record;
Null_String : constant F_String := (Controlled with Data => null);
end Enum2_Pkg;
| 26.333333 | 68 | 0.751055 |
c56ab35f9f9271ba81090de28d2ee64acbba55b4 | 1,530 | ads | Ada | tier-1/xcb/source/thin/xcb-xcb_get_atom_name_request_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_get_atom_name_request_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_get_atom_name_request_t.ads | charlie5/cBound | 741be08197a61ad9c72553e3302f3b669902216d | [
"0BSD"
] | null | null | null | -- This file is generated by SWIG. Please do not modify by hand.
--
with Interfaces;
with Interfaces.C;
with Interfaces.C.Pointers;
package xcb.xcb_get_atom_name_request_t is
-- Item
--
type Item is record
major_opcode : aliased Interfaces.Unsigned_8;
pad0 : aliased Interfaces.Unsigned_8;
length : aliased Interfaces.Unsigned_16;
atom : aliased xcb.xcb_atom_t;
end record;
-- Item_Array
--
type Item_Array is
array
(Interfaces.C
.size_t range <>) of aliased xcb.xcb_get_atom_name_request_t
.Item;
-- Pointer
--
package C_Pointers is new Interfaces.C.Pointers
(Index => Interfaces.C.size_t,
Element => xcb.xcb_get_atom_name_request_t.Item,
Element_Array => xcb.xcb_get_atom_name_request_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_get_atom_name_request_t
.Pointer;
-- Pointer_Pointer
--
package C_Pointer_Pointers is new Interfaces.C.Pointers
(Index => Interfaces.C.size_t,
Element => xcb.xcb_get_atom_name_request_t.Pointer,
Element_Array => xcb.xcb_get_atom_name_request_t.Pointer_Array,
Default_Terminator => null);
subtype Pointer_Pointer is C_Pointer_Pointers.Pointer;
end xcb.xcb_get_atom_name_request_t;
| 27.321429 | 74 | 0.658824 |
18fc92c345a6676b6c49d8af6390e75edec24460 | 1,262 | ads | Ada | software/lib/helper.ads | TUM-EI-RCS/StratoX | 5fdd04e01a25efef6052376f43ce85b5bc973392 | [
"BSD-3-Clause"
] | 12 | 2017-06-08T14:19:57.000Z | 2022-03-09T02:48:59.000Z | software/lib/helper.ads | TUM-EI-RCS/StratoX | 5fdd04e01a25efef6052376f43ce85b5bc973392 | [
"BSD-3-Clause"
] | 6 | 2017-06-08T13:13:50.000Z | 2020-05-15T09:32:43.000Z | software/lib/helper.ads | TUM-EI-RCS/StratoX | 5fdd04e01a25efef6052376f43ce85b5bc973392 | [
"BSD-3-Clause"
] | 3 | 2017-06-30T14:05:06.000Z | 2022-02-17T12:20:45.000Z | -- Institution: Technische Universität München
-- Department: Realtime Computer Systems (RCS)
-- Project: StratoX
-- Module: Helper
--
-- Authors: Emanuel Regnath ([email protected])
--
-- Description: Helper functions
--
-- ToDo:
-- [ ] Implementation
package Helper with SPARK_Mode is
generic
type Numeric_Type is range <>;
function addWrap(x : Numeric_Type;
inc : Numeric_Type) return Numeric_Type;
-- function deltaWrap(
-- low : Integer;
-- high : Integer)
-- return Integer
-- is ( if low < high then (high - low)
-- else (high'Last - low) + (high - low'First) );
-- to polar
procedure delay_ms (ms : Natural);
-- Saturate a Float value within a given range.
function Saturate
(Value : Float;
Min_Value : Float;
Max_Value : Float) return Float is
(if Value < Min_Value then
Min_Value
elsif Value > Max_Value then
Max_Value
else
Value);
pragma Inline (Saturate);
subtype Sign_Type is Float range -1.0 .. 1.0;
function sgn( x : Float ) return Sign_Type is
( if x = 0.0 then 0.0 elsif x > 0.0 then 1.0 else -1.0 );
end Helper;
| 23.37037 | 60 | 0.583994 |
2032bd1ac3b380a204b8a5ad1ba71d6e28171f00 | 5,346 | adb | Ada | src/smk-io.adb | mgrojo/smk | f1bf8c0efd98bf4e78082bfcd3a5ef7f48842dc4 | [
"Apache-2.0"
] | null | null | null | src/smk-io.adb | mgrojo/smk | f1bf8c0efd98bf4e78082bfcd3a5ef7f48842dc4 | [
"Apache-2.0"
] | null | null | null | src/smk-io.adb | mgrojo/smk | f1bf8c0efd98bf4e78082bfcd3a5ef7f48842dc4 | [
"Apache-2.0"
] | null | null | null | -- -----------------------------------------------------------------------------
-- smk, the smart make
-- © 2018 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.
-- -----------------------------------------------------------------------------
-- -----------------------------------------------------------------------------
-- Package: Smk.IO body
--
-- Implementation Notes:
--
-- Portability Issues:
--
-- Anticipated Changes:
--
-- -----------------------------------------------------------------------------
with Ada.Calendar.Formatting;
with Ada.Calendar.Time_Zones;
with Ada.Strings;
with Ada.Strings.Fixed;
with Ada.Text_IO;
package body Smk.IO is
Warnings : Natural := 0;
-- --------------------------------------------------------------------------
-- Function: GNU_Prefix
--
-- Purpose:
-- This function return a source/line/column prefix to messages compatible
-- whith GNU Standard
-- (refer to <https://www.gnu.org/prep/standards/html_node/Errors.html>),
-- That is :
-- > program:sourcefile:lineno: message
-- when there is an appropriate source file, or :
-- > program: message
-- otherwise.
--
-- --------------------------------------------------------------------------
function GNU_Prefix (File : in String;
Line : in Integer := 0) return String
is
use Ada.Strings;
use Ada.Strings.Fixed;
Trimed_File : constant String := Trim (File, Side => Both);
Trimed_Line : constant String := Trim (Positive'Image (Line),
Side => Both);
Common_Part : constant String := "smk:" & Trimed_File;
begin
if File = "" then
return "";
elsif Line = 0 then
return Common_Part & " ";
else
return Common_Part & ":" & Trimed_Line & ": ";
end if;
end GNU_Prefix;
-- --------------------------------------------------------------------------
procedure Put_Warning (Msg : in String;
File : in String := "";
Line : in Integer := 0) is
begin
Warnings := Warnings + 1;
Put_Line ("Warning : " & Msg, File, Line);
-- use the local version of Put_Line, and not the Ada.Text_IO one,
-- so that Warning messages are also ignored when --quiet.
end Put_Warning;
Errors : Natural := 0;
-- --------------------------------------------------------------------------
procedure Put_Error (Msg : in String;
File : in String := "";
Line : in Integer := 0) is
begin
Errors := Errors + 1;
Put_Line ("Error : " & Msg, File, Line, Level => Quiet);
-- Quiet because Error Msg should not be ignored
end Put_Error;
-- --------------------------------------------------------------------------
procedure Put_Exception (Msg : in String;
File : in String := "";
Line : in Integer := 0) is
begin
Ada.Text_IO.Put_Line (Ada.Text_IO.Standard_Error,
GNU_Prefix (File, Line) & "Exception : " & Msg);
end Put_Exception;
-- --------------------------------------------------------------------------
function Error_Count return Natural is (Errors);
function Warning_Count return Natural is (Warnings);
-- --------------------------------------------------------------------------
procedure Put_Debug_Line (Msg : in String;
Debug : in Boolean;
Prefix : in String;
File : in String := "";
Line : in Integer := 0) is
begin
if Debug then
Ada.Text_IO.Put_Line (GNU_Prefix (File, Line) & Prefix & Msg);
end if;
end Put_Debug_Line;
-- --------------------------------------------------------------------------
procedure Put_Line (Item : String;
File : in String := "";
Line : in Integer := 0;
Level : Print_Out_Level := Normal) is
begin
if Level >= Settings.Verbosity then
Ada.Text_IO.Put_Line (GNU_Prefix (File, Line) & Item);
end if;
end Put_Line;
-- --------------------------------------------------------------------------
function Image (Time : in Ada.Calendar.Time) return String is
begin
return Ada.Calendar.Formatting.Image
(Date => Time,
Include_Time_Fraction => True,
Time_Zone => Ada.Calendar.Time_Zones.UTC_Time_Offset);
end Image;
end Smk.IO;
| 38.185714 | 80 | 0.451927 |
20bf84aabafd2904b8f52c4b1348a492cdbd38ec | 40,734 | ads | Ada | source/amf/uml/amf-internals-uml_devices.ads | svn2github/matreshka | 9d222b3ad9da508855fb1f5adbe5e8a4fad4c530 | [
"BSD-3-Clause"
] | 24 | 2016-11-29T06:59:41.000Z | 2021-08-30T11:55:16.000Z | source/amf/uml/amf-internals-uml_devices.ads | svn2github/matreshka | 9d222b3ad9da508855fb1f5adbe5e8a4fad4c530 | [
"BSD-3-Clause"
] | 2 | 2019-01-16T05:15:20.000Z | 2019-02-03T10:03:32.000Z | source/amf/uml/amf-internals-uml_devices.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$
------------------------------------------------------------------------------
with AMF.Internals.UML_Nodes;
with AMF.String_Collections;
with AMF.UML.Behaviors.Collections;
with AMF.UML.Classes.Collections;
with AMF.UML.Classifier_Template_Parameters;
with AMF.UML.Classifiers.Collections;
with AMF.UML.Collaboration_Uses.Collections;
with AMF.UML.Connectable_Elements.Collections;
with AMF.UML.Connectors.Collections;
with AMF.UML.Constraints.Collections;
with AMF.UML.Dependencies.Collections;
with AMF.UML.Deployments.Collections;
with AMF.UML.Devices;
with AMF.UML.Element_Imports.Collections;
with AMF.UML.Extensions.Collections;
with AMF.UML.Features.Collections;
with AMF.UML.Generalization_Sets.Collections;
with AMF.UML.Generalizations.Collections;
with AMF.UML.Interface_Realizations.Collections;
with AMF.UML.Named_Elements.Collections;
with AMF.UML.Namespaces;
with AMF.UML.Nodes.Collections;
with AMF.UML.Operations.Collections;
with AMF.UML.Package_Imports.Collections;
with AMF.UML.Packageable_Elements.Collections;
with AMF.UML.Packages.Collections;
with AMF.UML.Parameterable_Elements.Collections;
with AMF.UML.Ports.Collections;
with AMF.UML.Properties.Collections;
with AMF.UML.Receptions.Collections;
with AMF.UML.Redefinable_Elements.Collections;
with AMF.UML.Redefinable_Template_Signatures;
with AMF.UML.String_Expressions;
with AMF.UML.Substitutions.Collections;
with AMF.UML.Template_Bindings.Collections;
with AMF.UML.Template_Parameters;
with AMF.UML.Template_Signatures;
with AMF.UML.Types;
with AMF.UML.Use_Cases.Collections;
with AMF.Visitors;
package AMF.Internals.UML_Devices is
type UML_Device_Proxy is
limited new AMF.Internals.UML_Nodes.UML_Node_Proxy
and AMF.UML.Devices.UML_Device with null record;
overriding function Get_Nested_Node
(Self : not null access constant UML_Device_Proxy)
return AMF.UML.Nodes.Collections.Set_Of_UML_Node;
-- Getter of Node::nestedNode.
--
-- The Nodes that are defined (nested) within the Node.
overriding function Get_Extension
(Self : not null access constant UML_Device_Proxy)
return AMF.UML.Extensions.Collections.Set_Of_UML_Extension;
-- Getter of Class::extension.
--
-- References the Extensions that specify additional properties of the
-- metaclass. The property is derived from the extensions whose memberEnds
-- are typed by the Class.
overriding function Get_Is_Abstract
(Self : not null access constant UML_Device_Proxy)
return Boolean;
-- Getter of Class::isAbstract.
--
-- True when a class is abstract.
-- If true, the Classifier does not provide a complete declaration and can
-- typically not be instantiated. An abstract classifier is intended to be
-- used by other classifiers e.g. as the target of general
-- metarelationships or generalization relationships.
overriding function Get_Is_Active
(Self : not null access constant UML_Device_Proxy)
return Boolean;
-- Getter of Class::isActive.
--
-- Determines whether an object specified by this class is active or not.
-- If true, then the owning class is referred to as an active class. If
-- false, then such a class is referred to as a passive class.
overriding procedure Set_Is_Active
(Self : not null access UML_Device_Proxy;
To : Boolean);
-- Setter of Class::isActive.
--
-- Determines whether an object specified by this class is active or not.
-- If true, then the owning class is referred to as an active class. If
-- false, then such a class is referred to as a passive class.
overriding function Get_Nested_Classifier
(Self : not null access constant UML_Device_Proxy)
return AMF.UML.Classifiers.Collections.Ordered_Set_Of_UML_Classifier;
-- Getter of Class::nestedClassifier.
--
-- References all the Classifiers that are defined (nested) within the
-- Class.
overriding function Get_Owned_Attribute
(Self : not null access constant UML_Device_Proxy)
return AMF.UML.Properties.Collections.Ordered_Set_Of_UML_Property;
-- Getter of Class::ownedAttribute.
--
-- The attributes (i.e. the properties) owned by the class.
overriding function Get_Owned_Operation
(Self : not null access constant UML_Device_Proxy)
return AMF.UML.Operations.Collections.Ordered_Set_Of_UML_Operation;
-- Getter of Class::ownedOperation.
--
-- The operations owned by the class.
overriding function Get_Owned_Reception
(Self : not null access constant UML_Device_Proxy)
return AMF.UML.Receptions.Collections.Set_Of_UML_Reception;
-- Getter of Class::ownedReception.
--
-- Receptions that objects of this class are willing to accept.
overriding function Get_Super_Class
(Self : not null access constant UML_Device_Proxy)
return AMF.UML.Classes.Collections.Set_Of_UML_Class;
-- Getter of Class::superClass.
--
-- This gives the superclasses of a class.
overriding function Get_Classifier_Behavior
(Self : not null access constant UML_Device_Proxy)
return AMF.UML.Behaviors.UML_Behavior_Access;
-- Getter of BehavioredClassifier::classifierBehavior.
--
-- A behavior specification that specifies the behavior of the classifier
-- itself.
overriding procedure Set_Classifier_Behavior
(Self : not null access UML_Device_Proxy;
To : AMF.UML.Behaviors.UML_Behavior_Access);
-- Setter of BehavioredClassifier::classifierBehavior.
--
-- A behavior specification that specifies the behavior of the classifier
-- itself.
overriding function Get_Interface_Realization
(Self : not null access constant UML_Device_Proxy)
return AMF.UML.Interface_Realizations.Collections.Set_Of_UML_Interface_Realization;
-- Getter of BehavioredClassifier::interfaceRealization.
--
-- The set of InterfaceRealizations owned by the BehavioredClassifier.
-- Interface realizations reference the Interfaces of which the
-- BehavioredClassifier is an implementation.
overriding function Get_Owned_Behavior
(Self : not null access constant UML_Device_Proxy)
return AMF.UML.Behaviors.Collections.Set_Of_UML_Behavior;
-- Getter of BehavioredClassifier::ownedBehavior.
--
-- References behavior specifications owned by a classifier.
overriding function Get_Attribute
(Self : not null access constant UML_Device_Proxy)
return AMF.UML.Properties.Collections.Set_Of_UML_Property;
-- Getter of Classifier::attribute.
--
-- Refers to all of the Properties that are direct (i.e. not inherited or
-- imported) attributes of the classifier.
overriding function Get_Collaboration_Use
(Self : not null access constant UML_Device_Proxy)
return AMF.UML.Collaboration_Uses.Collections.Set_Of_UML_Collaboration_Use;
-- Getter of Classifier::collaborationUse.
--
-- References the collaboration uses owned by the classifier.
overriding function Get_Feature
(Self : not null access constant UML_Device_Proxy)
return AMF.UML.Features.Collections.Set_Of_UML_Feature;
-- Getter of Classifier::feature.
--
-- Specifies each feature defined in the classifier.
-- Note that there may be members of the Classifier that are of the type
-- Feature but are not included in this association, e.g. inherited
-- features.
overriding function Get_General
(Self : not null access constant UML_Device_Proxy)
return AMF.UML.Classifiers.Collections.Set_Of_UML_Classifier;
-- Getter of Classifier::general.
--
-- Specifies the general Classifiers for this Classifier.
-- References the general classifier in the Generalization relationship.
overriding function Get_Generalization
(Self : not null access constant UML_Device_Proxy)
return AMF.UML.Generalizations.Collections.Set_Of_UML_Generalization;
-- Getter of Classifier::generalization.
--
-- Specifies the Generalization relationships for this Classifier. These
-- Generalizations navigaten to more general classifiers in the
-- generalization hierarchy.
overriding function Get_Inherited_Member
(Self : not null access constant UML_Device_Proxy)
return AMF.UML.Named_Elements.Collections.Set_Of_UML_Named_Element;
-- Getter of Classifier::inheritedMember.
--
-- Specifies all elements inherited by this classifier from the general
-- classifiers.
overriding function Get_Is_Final_Specialization
(Self : not null access constant UML_Device_Proxy)
return Boolean;
-- Getter of Classifier::isFinalSpecialization.
--
-- If true, the Classifier cannot be specialized by generalization. Note
-- that this property is preserved through package merge operations; that
-- is, the capability to specialize a Classifier (i.e.,
-- isFinalSpecialization =false) must be preserved in the resulting
-- Classifier of a package merge operation where a Classifier with
-- isFinalSpecialization =false is merged with a matching Classifier with
-- isFinalSpecialization =true: the resulting Classifier will have
-- isFinalSpecialization =false.
overriding procedure Set_Is_Final_Specialization
(Self : not null access UML_Device_Proxy;
To : Boolean);
-- Setter of Classifier::isFinalSpecialization.
--
-- If true, the Classifier cannot be specialized by generalization. Note
-- that this property is preserved through package merge operations; that
-- is, the capability to specialize a Classifier (i.e.,
-- isFinalSpecialization =false) must be preserved in the resulting
-- Classifier of a package merge operation where a Classifier with
-- isFinalSpecialization =false is merged with a matching Classifier with
-- isFinalSpecialization =true: the resulting Classifier will have
-- isFinalSpecialization =false.
overriding function Get_Owned_Template_Signature
(Self : not null access constant UML_Device_Proxy)
return AMF.UML.Redefinable_Template_Signatures.UML_Redefinable_Template_Signature_Access;
-- Getter of Classifier::ownedTemplateSignature.
--
-- The optional template signature specifying the formal template
-- parameters.
overriding procedure Set_Owned_Template_Signature
(Self : not null access UML_Device_Proxy;
To : AMF.UML.Redefinable_Template_Signatures.UML_Redefinable_Template_Signature_Access);
-- Setter of Classifier::ownedTemplateSignature.
--
-- The optional template signature specifying the formal template
-- parameters.
overriding function Get_Owned_Use_Case
(Self : not null access constant UML_Device_Proxy)
return AMF.UML.Use_Cases.Collections.Set_Of_UML_Use_Case;
-- Getter of Classifier::ownedUseCase.
--
-- References the use cases owned by this classifier.
overriding function Get_Powertype_Extent
(Self : not null access constant UML_Device_Proxy)
return AMF.UML.Generalization_Sets.Collections.Set_Of_UML_Generalization_Set;
-- Getter of Classifier::powertypeExtent.
--
-- Designates the GeneralizationSet of which the associated Classifier is
-- a power type.
overriding function Get_Redefined_Classifier
(Self : not null access constant UML_Device_Proxy)
return AMF.UML.Classifiers.Collections.Set_Of_UML_Classifier;
-- Getter of Classifier::redefinedClassifier.
--
-- References the Classifiers that are redefined by this Classifier.
overriding function Get_Representation
(Self : not null access constant UML_Device_Proxy)
return AMF.UML.Collaboration_Uses.UML_Collaboration_Use_Access;
-- Getter of Classifier::representation.
--
-- References a collaboration use which indicates the collaboration that
-- represents this classifier.
overriding procedure Set_Representation
(Self : not null access UML_Device_Proxy;
To : AMF.UML.Collaboration_Uses.UML_Collaboration_Use_Access);
-- Setter of Classifier::representation.
--
-- References a collaboration use which indicates the collaboration that
-- represents this classifier.
overriding function Get_Substitution
(Self : not null access constant UML_Device_Proxy)
return AMF.UML.Substitutions.Collections.Set_Of_UML_Substitution;
-- Getter of Classifier::substitution.
--
-- References the substitutions that are owned by this Classifier.
overriding function Get_Template_Parameter
(Self : not null access constant UML_Device_Proxy)
return AMF.UML.Classifier_Template_Parameters.UML_Classifier_Template_Parameter_Access;
-- Getter of Classifier::templateParameter.
--
-- The template parameter that exposes this element as a formal parameter.
overriding procedure Set_Template_Parameter
(Self : not null access UML_Device_Proxy;
To : AMF.UML.Classifier_Template_Parameters.UML_Classifier_Template_Parameter_Access);
-- Setter of Classifier::templateParameter.
--
-- The template parameter that exposes this element as a formal parameter.
overriding function Get_Use_Case
(Self : not null access constant UML_Device_Proxy)
return AMF.UML.Use_Cases.Collections.Set_Of_UML_Use_Case;
-- Getter of Classifier::useCase.
--
-- The set of use cases for which this Classifier is the subject.
overriding function Get_Element_Import
(Self : not null access constant UML_Device_Proxy)
return AMF.UML.Element_Imports.Collections.Set_Of_UML_Element_Import;
-- Getter of Namespace::elementImport.
--
-- References the ElementImports owned by the Namespace.
overriding function Get_Imported_Member
(Self : not null access constant UML_Device_Proxy)
return AMF.UML.Packageable_Elements.Collections.Set_Of_UML_Packageable_Element;
-- Getter of Namespace::importedMember.
--
-- References the PackageableElements that are members of this Namespace
-- as a result of either PackageImports or ElementImports.
overriding function Get_Member
(Self : not null access constant UML_Device_Proxy)
return AMF.UML.Named_Elements.Collections.Set_Of_UML_Named_Element;
-- Getter of Namespace::member.
--
-- A collection of NamedElements identifiable within the Namespace, either
-- by being owned or by being introduced by importing or inheritance.
overriding function Get_Owned_Member
(Self : not null access constant UML_Device_Proxy)
return AMF.UML.Named_Elements.Collections.Set_Of_UML_Named_Element;
-- Getter of Namespace::ownedMember.
--
-- A collection of NamedElements owned by the Namespace.
overriding function Get_Owned_Rule
(Self : not null access constant UML_Device_Proxy)
return AMF.UML.Constraints.Collections.Set_Of_UML_Constraint;
-- Getter of Namespace::ownedRule.
--
-- Specifies a set of Constraints owned by this Namespace.
overriding function Get_Package_Import
(Self : not null access constant UML_Device_Proxy)
return AMF.UML.Package_Imports.Collections.Set_Of_UML_Package_Import;
-- Getter of Namespace::packageImport.
--
-- References the PackageImports owned by the Namespace.
overriding function Get_Client_Dependency
(Self : not null access constant UML_Device_Proxy)
return AMF.UML.Dependencies.Collections.Set_Of_UML_Dependency;
-- Getter of NamedElement::clientDependency.
--
-- Indicates the dependencies that reference the client.
overriding function Get_Name_Expression
(Self : not null access constant UML_Device_Proxy)
return AMF.UML.String_Expressions.UML_String_Expression_Access;
-- Getter of NamedElement::nameExpression.
--
-- The string expression used to define the name of this named element.
overriding procedure Set_Name_Expression
(Self : not null access UML_Device_Proxy;
To : AMF.UML.String_Expressions.UML_String_Expression_Access);
-- Setter of NamedElement::nameExpression.
--
-- The string expression used to define the name of this named element.
overriding function Get_Namespace
(Self : not null access constant UML_Device_Proxy)
return AMF.UML.Namespaces.UML_Namespace_Access;
-- Getter of NamedElement::namespace.
--
-- Specifies the namespace that owns the NamedElement.
overriding function Get_Qualified_Name
(Self : not null access constant UML_Device_Proxy)
return AMF.Optional_String;
-- Getter of NamedElement::qualifiedName.
--
-- A name which allows the NamedElement to be identified within a
-- hierarchy of nested Namespaces. It is constructed from the names of the
-- containing namespaces starting at the root of the hierarchy and ending
-- with the name of the NamedElement itself.
overriding function Get_Package
(Self : not null access constant UML_Device_Proxy)
return AMF.UML.Packages.UML_Package_Access;
-- Getter of Type::package.
--
-- Specifies the owning package of this classifier, if any.
overriding procedure Set_Package
(Self : not null access UML_Device_Proxy;
To : AMF.UML.Packages.UML_Package_Access);
-- Setter of Type::package.
--
-- Specifies the owning package of this classifier, if any.
overriding function Get_Owning_Template_Parameter
(Self : not null access constant UML_Device_Proxy)
return AMF.UML.Template_Parameters.UML_Template_Parameter_Access;
-- Getter of ParameterableElement::owningTemplateParameter.
--
-- The formal template parameter that owns this element.
overriding procedure Set_Owning_Template_Parameter
(Self : not null access UML_Device_Proxy;
To : AMF.UML.Template_Parameters.UML_Template_Parameter_Access);
-- Setter of ParameterableElement::owningTemplateParameter.
--
-- The formal template parameter that owns this element.
overriding function Get_Template_Parameter
(Self : not null access constant UML_Device_Proxy)
return AMF.UML.Template_Parameters.UML_Template_Parameter_Access;
-- Getter of ParameterableElement::templateParameter.
--
-- The template parameter that exposes this element as a formal parameter.
overriding procedure Set_Template_Parameter
(Self : not null access UML_Device_Proxy;
To : AMF.UML.Template_Parameters.UML_Template_Parameter_Access);
-- Setter of ParameterableElement::templateParameter.
--
-- The template parameter that exposes this element as a formal parameter.
overriding function Get_Owned_Template_Signature
(Self : not null access constant UML_Device_Proxy)
return AMF.UML.Template_Signatures.UML_Template_Signature_Access;
-- Getter of TemplateableElement::ownedTemplateSignature.
--
-- The optional template signature specifying the formal template
-- parameters.
overriding procedure Set_Owned_Template_Signature
(Self : not null access UML_Device_Proxy;
To : AMF.UML.Template_Signatures.UML_Template_Signature_Access);
-- Setter of TemplateableElement::ownedTemplateSignature.
--
-- The optional template signature specifying the formal template
-- parameters.
overriding function Get_Template_Binding
(Self : not null access constant UML_Device_Proxy)
return AMF.UML.Template_Bindings.Collections.Set_Of_UML_Template_Binding;
-- Getter of TemplateableElement::templateBinding.
--
-- The optional bindings from this element to templates.
overriding function Get_Is_Leaf
(Self : not null access constant UML_Device_Proxy)
return Boolean;
-- Getter of RedefinableElement::isLeaf.
--
-- Indicates whether it is possible to further redefine a
-- RedefinableElement. If the value is true, then it is not possible to
-- further redefine the RedefinableElement. Note that this property is
-- preserved through package merge operations; that is, the capability to
-- redefine a RedefinableElement (i.e., isLeaf=false) must be preserved in
-- the resulting RedefinableElement of a package merge operation where a
-- RedefinableElement with isLeaf=false is merged with a matching
-- RedefinableElement with isLeaf=true: the resulting RedefinableElement
-- will have isLeaf=false. Default value is false.
overriding procedure Set_Is_Leaf
(Self : not null access UML_Device_Proxy;
To : Boolean);
-- Setter of RedefinableElement::isLeaf.
--
-- Indicates whether it is possible to further redefine a
-- RedefinableElement. If the value is true, then it is not possible to
-- further redefine the RedefinableElement. Note that this property is
-- preserved through package merge operations; that is, the capability to
-- redefine a RedefinableElement (i.e., isLeaf=false) must be preserved in
-- the resulting RedefinableElement of a package merge operation where a
-- RedefinableElement with isLeaf=false is merged with a matching
-- RedefinableElement with isLeaf=true: the resulting RedefinableElement
-- will have isLeaf=false. Default value is false.
overriding function Get_Redefined_Element
(Self : not null access constant UML_Device_Proxy)
return AMF.UML.Redefinable_Elements.Collections.Set_Of_UML_Redefinable_Element;
-- Getter of RedefinableElement::redefinedElement.
--
-- The redefinable element that is being redefined by this element.
overriding function Get_Redefinition_Context
(Self : not null access constant UML_Device_Proxy)
return AMF.UML.Classifiers.Collections.Set_Of_UML_Classifier;
-- Getter of RedefinableElement::redefinitionContext.
--
-- References the contexts that this element may be redefined from.
overriding function Get_Owned_Port
(Self : not null access constant UML_Device_Proxy)
return AMF.UML.Ports.Collections.Set_Of_UML_Port;
-- Getter of EncapsulatedClassifier::ownedPort.
--
-- References a set of ports that an encapsulated classifier owns.
overriding function Get_Owned_Connector
(Self : not null access constant UML_Device_Proxy)
return AMF.UML.Connectors.Collections.Set_Of_UML_Connector;
-- Getter of StructuredClassifier::ownedConnector.
--
-- References the connectors owned by the classifier.
overriding function Get_Part
(Self : not null access constant UML_Device_Proxy)
return AMF.UML.Properties.Collections.Set_Of_UML_Property;
-- Getter of StructuredClassifier::part.
--
-- References the properties specifying instances that the classifier owns
-- by composition. This association is derived, selecting those owned
-- properties where isComposite is true.
overriding function Get_Role
(Self : not null access constant UML_Device_Proxy)
return AMF.UML.Connectable_Elements.Collections.Set_Of_UML_Connectable_Element;
-- Getter of StructuredClassifier::role.
--
-- References the roles that instances may play in this classifier.
overriding function Get_Deployed_Element
(Self : not null access constant UML_Device_Proxy)
return AMF.UML.Packageable_Elements.Collections.Set_Of_UML_Packageable_Element;
-- Getter of DeploymentTarget::deployedElement.
--
-- The set of elements that are manifested in an Artifact that is involved
-- in Deployment to a DeploymentTarget.
overriding function Get_Deployment
(Self : not null access constant UML_Device_Proxy)
return AMF.UML.Deployments.Collections.Set_Of_UML_Deployment;
-- Getter of DeploymentTarget::deployment.
--
-- The set of Deployments for a DeploymentTarget.
overriding function Extension
(Self : not null access constant UML_Device_Proxy)
return AMF.UML.Extensions.Collections.Set_Of_UML_Extension;
-- Operation Class::extension.
--
-- Missing derivation for Class::/extension : Extension
overriding function Inherit
(Self : not null access constant UML_Device_Proxy;
Inhs : AMF.UML.Named_Elements.Collections.Set_Of_UML_Named_Element)
return AMF.UML.Named_Elements.Collections.Set_Of_UML_Named_Element;
-- Operation Class::inherit.
--
-- The inherit operation is overridden to exclude redefined properties.
overriding function Super_Class
(Self : not null access constant UML_Device_Proxy)
return AMF.UML.Classes.Collections.Set_Of_UML_Class;
-- Operation Class::superClass.
--
-- Missing derivation for Class::/superClass : Class
overriding function All_Features
(Self : not null access constant UML_Device_Proxy)
return AMF.UML.Features.Collections.Set_Of_UML_Feature;
-- Operation Classifier::allFeatures.
--
-- The query allFeatures() gives all of the features in the namespace of
-- the classifier. In general, through mechanisms such as inheritance,
-- this will be a larger set than feature.
overriding function Conforms_To
(Self : not null access constant UML_Device_Proxy;
Other : AMF.UML.Classifiers.UML_Classifier_Access)
return Boolean;
-- Operation Classifier::conformsTo.
--
-- The query conformsTo() gives true for a classifier that defines a type
-- that conforms to another. This is used, for example, in the
-- specification of signature conformance for operations.
overriding function General
(Self : not null access constant UML_Device_Proxy)
return AMF.UML.Classifiers.Collections.Set_Of_UML_Classifier;
-- Operation Classifier::general.
--
-- The general classifiers are the classifiers referenced by the
-- generalization relationships.
overriding function Has_Visibility_Of
(Self : not null access constant UML_Device_Proxy;
N : AMF.UML.Named_Elements.UML_Named_Element_Access)
return Boolean;
-- Operation Classifier::hasVisibilityOf.
--
-- The query hasVisibilityOf() determines whether a named element is
-- visible in the classifier. By default all are visible. It is only
-- called when the argument is something owned by a parent.
overriding function Inheritable_Members
(Self : not null access constant UML_Device_Proxy;
C : AMF.UML.Classifiers.UML_Classifier_Access)
return AMF.UML.Named_Elements.Collections.Set_Of_UML_Named_Element;
-- Operation Classifier::inheritableMembers.
--
-- The query inheritableMembers() gives all of the members of a classifier
-- that may be inherited in one of its descendants, subject to whatever
-- visibility restrictions apply.
overriding function Inherited_Member
(Self : not null access constant UML_Device_Proxy)
return AMF.UML.Named_Elements.Collections.Set_Of_UML_Named_Element;
-- Operation Classifier::inheritedMember.
--
-- The inheritedMember association is derived by inheriting the
-- inheritable members of the parents.
-- The inheritedMember association is derived by inheriting the
-- inheritable members of the parents.
overriding function Is_Template
(Self : not null access constant UML_Device_Proxy)
return Boolean;
-- Operation Classifier::isTemplate.
--
-- The query isTemplate() returns whether this templateable element is
-- actually a template.
overriding function May_Specialize_Type
(Self : not null access constant UML_Device_Proxy;
C : AMF.UML.Classifiers.UML_Classifier_Access)
return Boolean;
-- Operation Classifier::maySpecializeType.
--
-- The query maySpecializeType() determines whether this classifier may
-- have a generalization relationship to classifiers of the specified
-- type. By default a classifier may specialize classifiers of the same or
-- a more general type. It is intended to be redefined by classifiers that
-- have different specialization constraints.
overriding function Exclude_Collisions
(Self : not null access constant UML_Device_Proxy;
Imps : AMF.UML.Packageable_Elements.Collections.Set_Of_UML_Packageable_Element)
return AMF.UML.Packageable_Elements.Collections.Set_Of_UML_Packageable_Element;
-- Operation Namespace::excludeCollisions.
--
-- The query excludeCollisions() excludes from a set of
-- PackageableElements any that would not be distinguishable from each
-- other in this namespace.
overriding function Get_Names_Of_Member
(Self : not null access constant UML_Device_Proxy;
Element : AMF.UML.Named_Elements.UML_Named_Element_Access)
return AMF.String_Collections.Set_Of_String;
-- Operation Namespace::getNamesOfMember.
--
-- The query getNamesOfMember() takes importing into account. It gives
-- back the set of names that an element would have in an importing
-- namespace, either because it is owned, or if not owned then imported
-- individually, or if not individually then from a package.
-- The query getNamesOfMember() gives a set of all of the names that a
-- member would have in a Namespace. In general a member can have multiple
-- names in a Namespace if it is imported more than once with different
-- aliases. The query takes account of importing. It gives back the set of
-- names that an element would have in an importing namespace, either
-- because it is owned, or if not owned then imported individually, or if
-- not individually then from a package.
overriding function Import_Members
(Self : not null access constant UML_Device_Proxy;
Imps : AMF.UML.Packageable_Elements.Collections.Set_Of_UML_Packageable_Element)
return AMF.UML.Packageable_Elements.Collections.Set_Of_UML_Packageable_Element;
-- Operation Namespace::importMembers.
--
-- The query importMembers() defines which of a set of PackageableElements
-- are actually imported into the namespace. This excludes hidden ones,
-- i.e., those which have names that conflict with names of owned members,
-- and also excludes elements which would have the same name when imported.
overriding function Imported_Member
(Self : not null access constant UML_Device_Proxy)
return AMF.UML.Packageable_Elements.Collections.Set_Of_UML_Packageable_Element;
-- Operation Namespace::importedMember.
--
-- The importedMember property is derived from the ElementImports and the
-- PackageImports. References the PackageableElements that are members of
-- this Namespace as a result of either PackageImports or ElementImports.
overriding function Members_Are_Distinguishable
(Self : not null access constant UML_Device_Proxy)
return Boolean;
-- Operation Namespace::membersAreDistinguishable.
--
-- The Boolean query membersAreDistinguishable() determines whether all of
-- the namespace's members are distinguishable within it.
overriding function Owned_Member
(Self : not null access constant UML_Device_Proxy)
return AMF.UML.Named_Elements.Collections.Set_Of_UML_Named_Element;
-- Operation Namespace::ownedMember.
--
-- Missing derivation for Namespace::/ownedMember : NamedElement
overriding function All_Owning_Packages
(Self : not null access constant UML_Device_Proxy)
return AMF.UML.Packages.Collections.Set_Of_UML_Package;
-- Operation NamedElement::allOwningPackages.
--
-- The query allOwningPackages() returns all the directly or indirectly
-- owning packages.
overriding function Is_Distinguishable_From
(Self : not null access constant UML_Device_Proxy;
N : AMF.UML.Named_Elements.UML_Named_Element_Access;
Ns : AMF.UML.Namespaces.UML_Namespace_Access)
return Boolean;
-- Operation NamedElement::isDistinguishableFrom.
--
-- The query isDistinguishableFrom() determines whether two NamedElements
-- may logically co-exist within a Namespace. By default, two named
-- elements are distinguishable if (a) they have unrelated types or (b)
-- they have related types but different names.
overriding function Namespace
(Self : not null access constant UML_Device_Proxy)
return AMF.UML.Namespaces.UML_Namespace_Access;
-- Operation NamedElement::namespace.
--
-- Missing derivation for NamedElement::/namespace : Namespace
overriding function Conforms_To
(Self : not null access constant UML_Device_Proxy;
Other : AMF.UML.Types.UML_Type_Access)
return Boolean;
-- Operation Type::conformsTo.
--
-- The query conformsTo() gives true for a type that conforms to another.
-- By default, two types do not conform to each other. This query is
-- intended to be redefined for specific conformance situations.
overriding function Is_Compatible_With
(Self : not null access constant UML_Device_Proxy;
P : AMF.UML.Parameterable_Elements.UML_Parameterable_Element_Access)
return Boolean;
-- Operation ParameterableElement::isCompatibleWith.
--
-- The query isCompatibleWith() determines if this parameterable element
-- is compatible with the specified parameterable element. By default
-- parameterable element P is compatible with parameterable element Q if
-- the kind of P is the same or a subtype as the kind of Q. Subclasses
-- should override this operation to specify different compatibility
-- constraints.
overriding function Is_Template_Parameter
(Self : not null access constant UML_Device_Proxy)
return Boolean;
-- Operation ParameterableElement::isTemplateParameter.
--
-- The query isTemplateParameter() determines if this parameterable
-- element is exposed as a formal template parameter.
overriding function Parameterable_Elements
(Self : not null access constant UML_Device_Proxy)
return AMF.UML.Parameterable_Elements.Collections.Set_Of_UML_Parameterable_Element;
-- Operation TemplateableElement::parameterableElements.
--
-- The query parameterableElements() returns the set of elements that may
-- be used as the parametered elements for a template parameter of this
-- templateable element. By default, this set includes all the owned
-- elements. Subclasses may override this operation if they choose to
-- restrict the set of parameterable elements.
overriding function Is_Consistent_With
(Self : not null access constant UML_Device_Proxy;
Redefinee : AMF.UML.Redefinable_Elements.UML_Redefinable_Element_Access)
return Boolean;
-- Operation RedefinableElement::isConsistentWith.
--
-- The query isConsistentWith() specifies, for any two RedefinableElements
-- in a context in which redefinition is possible, whether redefinition
-- would be logically consistent. By default, this is false; this
-- operation must be overridden for subclasses of RedefinableElement to
-- define the consistency conditions.
overriding function Is_Redefinition_Context_Valid
(Self : not null access constant UML_Device_Proxy;
Redefined : AMF.UML.Redefinable_Elements.UML_Redefinable_Element_Access)
return Boolean;
-- Operation RedefinableElement::isRedefinitionContextValid.
--
-- The query isRedefinitionContextValid() specifies whether the
-- redefinition contexts of this RedefinableElement are properly related
-- to the redefinition contexts of the specified RedefinableElement to
-- allow this element to redefine the other. By default at least one of
-- the redefinition contexts of this element must be a specialization of
-- at least one of the redefinition contexts of the specified element.
overriding function Owned_Port
(Self : not null access constant UML_Device_Proxy)
return AMF.UML.Ports.Collections.Set_Of_UML_Port;
-- Operation EncapsulatedClassifier::ownedPort.
--
-- Missing derivation for EncapsulatedClassifier::/ownedPort : Port
overriding function Part
(Self : not null access constant UML_Device_Proxy)
return AMF.UML.Properties.Collections.Set_Of_UML_Property;
-- Operation StructuredClassifier::part.
--
-- Missing derivation for StructuredClassifier::/part : Property
overriding function Deployed_Element
(Self : not null access constant UML_Device_Proxy)
return AMF.UML.Packageable_Elements.Collections.Set_Of_UML_Packageable_Element;
-- Operation DeploymentTarget::deployedElement.
--
-- Missing derivation for DeploymentTarget::/deployedElement :
-- PackageableElement
overriding procedure Enter_Element
(Self : not null access constant UML_Device_Proxy;
Visitor : in out AMF.Visitors.Abstract_Visitor'Class;
Control : in out AMF.Visitors.Traverse_Control);
-- Dispatch call to corresponding subprogram of visitor interface.
overriding procedure Leave_Element
(Self : not null access constant UML_Device_Proxy;
Visitor : in out AMF.Visitors.Abstract_Visitor'Class;
Control : in out AMF.Visitors.Traverse_Control);
-- Dispatch call to corresponding subprogram of visitor interface.
overriding procedure Visit_Element
(Self : not null access constant UML_Device_Proxy;
Iterator : in out AMF.Visitors.Abstract_Iterator'Class;
Visitor : in out AMF.Visitors.Abstract_Visitor'Class;
Control : in out AMF.Visitors.Traverse_Control);
-- Dispatch call to corresponding subprogram of iterator interface.
end AMF.Internals.UML_Devices;
| 45.360802 | 96 | 0.722566 |
cbb813d5926ed3b56c3841c720cfeb5220a78efb | 4,908 | adb | Ada | src/tamp.adb | Lucretia/tamp2 | c94c4ccb17d9e279099dcea72553b0abaa2a8403 | [
"BSD-2-Clause-FreeBSD"
] | 7 | 2015-07-12T14:32:52.000Z | 2020-09-23T11:25:43.000Z | src/tamp.adb | Lucretia/tamp2 | c94c4ccb17d9e279099dcea72553b0abaa2a8403 | [
"BSD-2-Clause-FreeBSD"
] | null | null | null | src/tamp.adb | Lucretia/tamp2 | c94c4ccb17d9e279099dcea72553b0abaa2a8403 | [
"BSD-2-Clause-FreeBSD"
] | 1 | 2021-07-13T11:52:03.000Z | 2021-07-13T11:52:03.000Z | -- -*- Mode: Ada -*-
-- Filename : tamp.adb
-- Description : A "hello world" style OS kernel written in Ada.
-- Author : Luke A. Guest
-- Created On : Thu Jun 14 11:59:53 2012
-- Licence : See LICENCE in the root directory.
pragma Restrictions (No_Obsolescent_Features);
with Console; use Console;
with Multiboot; use Multiboot;
-- with System.Address_To_Access_Conversions;
-- with Ada.Unchecked_Conversion;
use type Multiboot.Magic_Values;
procedure TAMP is
Line : Screen_Height_Range := Screen_Height_Range'First;
begin
null;
Clear;
Put ("Hello, TAMP in Ada",
Screen_Width_Range'First,
Line);
Line := Line + 1;
if Magic = Magic_Value then
Put ("Magic numbers match!", Screen_Width_Range'First, Line);
else
Put ("Magic numbers don't match!", Screen_Width_Range'First, Line);
raise Program_Error;
end if;
-- Line := Line + 1;
-- if Info.Flags.Memory then
-- Put ("Memory info present", Screen_Width_Range'First, Line);
-- Line := Line + 1;
-- end if;
-- if Info.Flags.Boot_Device then
-- Put ("Boot device info present", Screen_Width_Range'First, Line);
-- Line := Line + 1;
-- end if;
-- if Info.Flags.Command_Line then
-- Put ("Command line info present", Screen_Width_Range'First, Line);
-- Line := Line + 1;
-- end if;
-- if Info.Flags.Modules then
-- Put ("Modules info present", Screen_Width_Range'First, Line);
-- Line := Line + 1;
-- if Info.Modules.Count = 2 then
-- declare
-- type My_Modules_Array is new Modules_Array
-- (1 .. Natural (Info.Modules.Count));
-- type My_Modules_Array_Access is access all My_Modules_Array;
-- -- My_Modules : aliased Modules_Array
-- -- (1 .. Natural (Info.Modules.Count));
-- -- pragma Unreferenced (My_Modules);
-- package To_Modules is new System.Address_To_Access_Conversions
-- (Object => My_Modules_Array_Access);
-- function Conv is new Ada.Unchecked_Conversion
-- (Source => To_Modules.Object_Pointer,
-- Target => My_Modules_Array_Access);
-- Modules : constant My_Modules_Array_Access :=
-- Conv (To_Modules.To_Pointer
-- (Info.Modules.First));
-- M : Multiboot.Modules;
-- pragma Unreferenced (M);
-- begin
-- Put ("2 modules loaded is correct",
-- Screen_Width_Range'First, Line);
-- for I in 1 .. Info.Modules.Count loop
-- M := Modules (Natural (I));
-- end loop;
-- Line := Line + 1;
-- end;
-- end if;
-- end if;
-- if Info.Flags.Symbol_Table then
-- Put ("Symbol table info present", Screen_Width_Range'First, Line);
-- Line := Line + 1;
-- end if;
-- if Info.Flags.Section_Header_Table then
-- Put ("Section header table info present",
-- Screen_Width_Range'First, Line);
-- Line := Line + 1;
-- end if;
-- if Info.Flags.BIOS_Memory_Map then
-- Put ("BIOS memory map info present", Screen_Width_Range'First, Line);
-- Line := Line + 1;
-- declare
-- Map : Memory_Map_Entry_Access := Multiboot.First_Memory_Map_Entry;
-- begin
-- while Map /= null loop
-- Map := Multiboot.Next_Memory_Map_Entry (Map);
-- end loop;
-- end;
-- end if;
-- if Info.Flags.Drives then
-- Put ("Drives info present", Screen_Width_Range'First, Line);
-- Line := Line + 1;
-- end if;
-- if Info.Flags.ROM_Configuration then
-- Put ("ROM configuration info present",
-- Screen_Width_Range'First, Line);
-- Line := Line + 1;
-- end if;
-- if Info.Flags.Boot_Loader then
-- Put ("Boot loader info present", Screen_Width_Range'First, Line);
-- Line := Line + 1;
-- end if;
-- if Info.Flags.APM_Table then
-- Put ("APM table info present", Screen_Width_Range'First, Line);
-- Line := Line + 1;
-- end if;
-- if Info.Flags.Graphics_Table then
-- Put ("Graphics table info present", Screen_Width_Range'First, Line);
-- Line := Line + 1;
-- end if;
-- raise Constraint_Error;
-- raise Console.TE;
-- raise Constraint_Error;
-- Put (Natural 'Image (54),
-- Screen_Width_Range'First,
-- Screen_Height_Range'First + 1);
-- exception
-- when Constraint_Error =>
-- Put ("Constraint Error caught", 1, 15);
-- when Program_Error =>
-- null;
-- when Console.TE =>
-- Put ("TE caught", 1, 2);
end TAMP;
pragma No_Return (TAMP);
| 28.701754 | 79 | 0.561328 |
cbfa0ec5b1222739817d84b5efe256f17498f59b | 4,435 | ads | Ada | source/web/fastcgi/matreshka-fastcgi.ads | svn2github/matreshka | 9d222b3ad9da508855fb1f5adbe5e8a4fad4c530 | [
"BSD-3-Clause"
] | 24 | 2016-11-29T06:59:41.000Z | 2021-08-30T11:55:16.000Z | source/web/fastcgi/matreshka-fastcgi.ads | svn2github/matreshka | 9d222b3ad9da508855fb1f5adbe5e8a4fad4c530 | [
"BSD-3-Clause"
] | 2 | 2019-01-16T05:15:20.000Z | 2019-02-03T10:03:32.000Z | source/web/fastcgi/matreshka-fastcgi.ads | svn2github/matreshka | 9d222b3ad9da508855fb1f5adbe5e8a4fad4c530 | [
"BSD-3-Clause"
] | 4 | 2017-07-18T07:11:05.000Z | 2020-06-21T03:02:25.000Z | ------------------------------------------------------------------------------
-- --
-- Matreshka Project --
-- --
-- Web Framework --
-- --
-- Runtime Library Component --
-- --
------------------------------------------------------------------------------
-- --
-- Copyright © 2010-2011, 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.Containers.Hashed_Maps;
with League.Stream_Element_Vectors;
package Matreshka.FastCGI is
pragma Preelaborate;
type FCGI_Request_Identifier is mod 2 ** 16;
function Hash
(Item : League.Stream_Element_Vectors.Stream_Element_Vector)
return Ada.Containers.Hash_Type;
package Maps is
new Ada.Containers.Hashed_Maps
(League.Stream_Element_Vectors.Stream_Element_Vector,
League.Stream_Element_Vectors.Stream_Element_Vector,
Hash,
League.Stream_Element_Vectors."=",
League.Stream_Element_Vectors."=");
type Descriptor is record
Request_Id : FCGI_Request_Identifier;
Request_Headers : Maps.Map;
Stdin : League.Stream_Element_Vectors.Stream_Element_Vector;
Query_Items : Maps.Map;
Reply_Headers : Maps.Map;
Stdout : League.Stream_Element_Vectors.Stream_Element_Vector;
Stderr : League.Stream_Element_Vectors.Stream_Element_Vector;
end record;
type Descriptor_Access is access all Descriptor;
end Matreshka.FastCGI;
| 56.139241 | 78 | 0.466516 |
20d7e7f5df5d76c98c7597cf668643177b63660d | 419,323 | adb | Ada | boards/ip_colordetect/colordetect/colordetect/.autopilot/db/xFInRange_9_0_2160_3840_15_0_1_9_1_3_s.adb | Kgfu/PYNQ_HelloWorld | a5197130e7d4a5e7f382c3963349c1c0bd213213 | [
"BSD-3-Clause"
] | null | null | null | boards/ip_colordetect/colordetect/colordetect/.autopilot/db/xFInRange_9_0_2160_3840_15_0_1_9_1_3_s.adb | Kgfu/PYNQ_HelloWorld | a5197130e7d4a5e7f382c3963349c1c0bd213213 | [
"BSD-3-Clause"
] | null | null | null | boards/ip_colordetect/colordetect/colordetect/.autopilot/db/xFInRange_9_0_2160_3840_15_0_1_9_1_3_s.adb | Kgfu/PYNQ_HelloWorld | a5197130e7d4a5e7f382c3963349c1c0bd213213 | [
"BSD-3-Clause"
] | null | null | null | <?xml version="1.0" encoding="UTF-8" standalone="yes" ?>
<!DOCTYPE boost_serialization>
<boost_serialization signature="serialization::archive" version="15">
<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>xFInRange_9_0_2160_3840_15_0_1_9_1_3_s</name>
<ret_bitwidth>0</ret_bitwidth>
<ports class_id="2" tracking_level="0" version="0">
<count>22</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>rgb2hsv_4100</name>
<fileName/>
<fileDirectory/>
<lineNumber>0</lineNumber>
<contextFuncName/>
<contextNormFuncName/>
<inlineStackInfo class_id="6" tracking_level="0" version="0">
<count>0</count>
<item_version>0</item_version>
</inlineStackInfo>
<originalName/>
<rtlName/>
<control/>
<opType/>
<implIndex/>
<coreName>FIFO_SRL</coreName>
<coreId>3579098128</coreId>
</Obj>
<bitwidth>24</bitwidth>
</Value>
<direction>0</direction>
<if_type>3</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>imgHelper1_4101</name>
<fileName/>
<fileDirectory/>
<lineNumber>0</lineNumber>
<contextFuncName/>
<contextNormFuncName/>
<inlineStackInfo>
<count>0</count>
<item_version>0</item_version>
</inlineStackInfo>
<originalName/>
<rtlName/>
<control/>
<opType/>
<implIndex/>
<coreName>FIFO_SRL</coreName>
<coreId>3578060944</coreId>
</Obj>
<bitwidth>8</bitwidth>
</Value>
<direction>1</direction>
<if_type>3</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>p_read</name>
<fileName/>
<fileDirectory/>
<lineNumber>0</lineNumber>
<contextFuncName/>
<contextNormFuncName/>
<inlineStackInfo>
<count>0</count>
<item_version>0</item_version>
</inlineStackInfo>
<originalName/>
<rtlName/>
<control/>
<opType/>
<implIndex/>
<coreName/>
<coreId>544175136</coreId>
</Obj>
<bitwidth>8</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="_4">
<Value>
<Obj>
<type>1</type>
<id>4</id>
<name>p_read1</name>
<fileName/>
<fileDirectory/>
<lineNumber>0</lineNumber>
<contextFuncName/>
<contextNormFuncName/>
<inlineStackInfo>
<count>0</count>
<item_version>0</item_version>
</inlineStackInfo>
<originalName/>
<rtlName/>
<control/>
<opType/>
<implIndex/>
<coreName/>
<coreId>22</coreId>
</Obj>
<bitwidth>8</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="_5">
<Value>
<Obj>
<type>1</type>
<id>5</id>
<name>p_read2</name>
<fileName/>
<fileDirectory/>
<lineNumber>0</lineNumber>
<contextFuncName/>
<contextNormFuncName/>
<inlineStackInfo>
<count>0</count>
<item_version>0</item_version>
</inlineStackInfo>
<originalName/>
<rtlName/>
<control/>
<opType/>
<implIndex/>
<coreName/>
<coreId>132</coreId>
</Obj>
<bitwidth>8</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="_6">
<Value>
<Obj>
<type>1</type>
<id>6</id>
<name>p_read3</name>
<fileName/>
<fileDirectory/>
<lineNumber>0</lineNumber>
<contextFuncName/>
<contextNormFuncName/>
<inlineStackInfo>
<count>0</count>
<item_version>0</item_version>
</inlineStackInfo>
<originalName/>
<rtlName/>
<control/>
<opType/>
<implIndex/>
<coreName/>
<coreId>1735289188</coreId>
</Obj>
<bitwidth>8</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="_7">
<Value>
<Obj>
<type>1</type>
<id>7</id>
<name>p_read4</name>
<fileName/>
<fileDirectory/>
<lineNumber>0</lineNumber>
<contextFuncName/>
<contextNormFuncName/>
<inlineStackInfo>
<count>0</count>
<item_version>0</item_version>
</inlineStackInfo>
<originalName/>
<rtlName/>
<control/>
<opType/>
<implIndex/>
<coreName/>
<coreId>3579485648</coreId>
</Obj>
<bitwidth>8</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="_8">
<Value>
<Obj>
<type>1</type>
<id>8</id>
<name>p_read5</name>
<fileName/>
<fileDirectory/>
<lineNumber>0</lineNumber>
<contextFuncName/>
<contextNormFuncName/>
<inlineStackInfo>
<count>0</count>
<item_version>0</item_version>
</inlineStackInfo>
<originalName/>
<rtlName/>
<control/>
<opType/>
<implIndex/>
<coreName/>
<coreId>1210929486</coreId>
</Obj>
<bitwidth>8</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="_9">
<Value>
<Obj>
<type>1</type>
<id>9</id>
<name>p_read6</name>
<fileName/>
<fileDirectory/>
<lineNumber>0</lineNumber>
<contextFuncName/>
<contextNormFuncName/>
<inlineStackInfo>
<count>0</count>
<item_version>0</item_version>
</inlineStackInfo>
<originalName/>
<rtlName/>
<control/>
<opType/>
<implIndex/>
<coreName/>
<coreId>657</coreId>
</Obj>
<bitwidth>8</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="_10">
<Value>
<Obj>
<type>1</type>
<id>10</id>
<name>p_read7</name>
<fileName/>
<fileDirectory/>
<lineNumber>0</lineNumber>
<contextFuncName/>
<contextNormFuncName/>
<inlineStackInfo>
<count>0</count>
<item_version>0</item_version>
</inlineStackInfo>
<originalName/>
<rtlName/>
<control/>
<opType/>
<implIndex/>
<coreName/>
<coreId>49</coreId>
</Obj>
<bitwidth>8</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="_11">
<Value>
<Obj>
<type>1</type>
<id>11</id>
<name>p_read8</name>
<fileName/>
<fileDirectory/>
<lineNumber>0</lineNumber>
<contextFuncName/>
<contextNormFuncName/>
<inlineStackInfo>
<count>0</count>
<item_version>0</item_version>
</inlineStackInfo>
<originalName/>
<rtlName/>
<control/>
<opType/>
<implIndex/>
<coreName/>
<coreId>49</coreId>
</Obj>
<bitwidth>8</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="_12">
<Value>
<Obj>
<type>1</type>
<id>12</id>
<name>p_read9</name>
<fileName/>
<fileDirectory/>
<lineNumber>0</lineNumber>
<contextFuncName/>
<contextNormFuncName/>
<inlineStackInfo>
<count>0</count>
<item_version>0</item_version>
</inlineStackInfo>
<originalName/>
<rtlName/>
<control/>
<opType/>
<implIndex/>
<coreName/>
<coreId>177</coreId>
</Obj>
<bitwidth>8</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="_13">
<Value>
<Obj>
<type>1</type>
<id>13</id>
<name>p_read10</name>
<fileName/>
<fileDirectory/>
<lineNumber>0</lineNumber>
<contextFuncName/>
<contextNormFuncName/>
<inlineStackInfo>
<count>0</count>
<item_version>0</item_version>
</inlineStackInfo>
<originalName/>
<rtlName/>
<control/>
<opType/>
<implIndex/>
<coreName/>
<coreId>0</coreId>
</Obj>
<bitwidth>8</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="_14">
<Value>
<Obj>
<type>1</type>
<id>14</id>
<name>p_read11</name>
<fileName/>
<fileDirectory/>
<lineNumber>0</lineNumber>
<contextFuncName/>
<contextNormFuncName/>
<inlineStackInfo>
<count>0</count>
<item_version>0</item_version>
</inlineStackInfo>
<originalName/>
<rtlName/>
<control/>
<opType/>
<implIndex/>
<coreName/>
<coreId>49</coreId>
</Obj>
<bitwidth>8</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="_15">
<Value>
<Obj>
<type>1</type>
<id>15</id>
<name>p_read12</name>
<fileName/>
<fileDirectory/>
<lineNumber>0</lineNumber>
<contextFuncName/>
<contextNormFuncName/>
<inlineStackInfo>
<count>0</count>
<item_version>0</item_version>
</inlineStackInfo>
<originalName/>
<rtlName/>
<control/>
<opType/>
<implIndex/>
<coreName/>
<coreId>49</coreId>
</Obj>
<bitwidth>8</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="_16">
<Value>
<Obj>
<type>1</type>
<id>16</id>
<name>p_read13</name>
<fileName/>
<fileDirectory/>
<lineNumber>0</lineNumber>
<contextFuncName/>
<contextNormFuncName/>
<inlineStackInfo>
<count>0</count>
<item_version>0</item_version>
</inlineStackInfo>
<originalName/>
<rtlName/>
<control/>
<opType/>
<implIndex/>
<coreName/>
<coreId>177</coreId>
</Obj>
<bitwidth>8</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="_17">
<Value>
<Obj>
<type>1</type>
<id>17</id>
<name>p_read14</name>
<fileName/>
<fileDirectory/>
<lineNumber>0</lineNumber>
<contextFuncName/>
<contextNormFuncName/>
<inlineStackInfo>
<count>0</count>
<item_version>0</item_version>
</inlineStackInfo>
<originalName/>
<rtlName/>
<control/>
<opType/>
<implIndex/>
<coreName/>
<coreId>20</coreId>
</Obj>
<bitwidth>8</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="_18">
<Value>
<Obj>
<type>1</type>
<id>18</id>
<name>p_read15</name>
<fileName/>
<fileDirectory/>
<lineNumber>0</lineNumber>
<contextFuncName/>
<contextNormFuncName/>
<inlineStackInfo>
<count>0</count>
<item_version>0</item_version>
</inlineStackInfo>
<originalName/>
<rtlName/>
<control/>
<opType/>
<implIndex/>
<coreName/>
<coreId>1713399662</coreId>
</Obj>
<bitwidth>8</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="_19">
<Value>
<Obj>
<type>1</type>
<id>19</id>
<name>p_read16</name>
<fileName/>
<fileDirectory/>
<lineNumber>0</lineNumber>
<contextFuncName/>
<contextNormFuncName/>
<inlineStackInfo>
<count>0</count>
<item_version>0</item_version>
</inlineStackInfo>
<originalName/>
<rtlName/>
<control/>
<opType/>
<implIndex/>
<coreName/>
<coreId>49</coreId>
</Obj>
<bitwidth>8</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="_20">
<Value>
<Obj>
<type>1</type>
<id>20</id>
<name>p_read17</name>
<fileName/>
<fileDirectory/>
<lineNumber>0</lineNumber>
<contextFuncName/>
<contextNormFuncName/>
<inlineStackInfo>
<count>0</count>
<item_version>0</item_version>
</inlineStackInfo>
<originalName/>
<rtlName/>
<control/>
<opType/>
<implIndex/>
<coreName/>
<coreId>177</coreId>
</Obj>
<bitwidth>8</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="_21">
<Value>
<Obj>
<type>1</type>
<id>21</id>
<name>p_read18</name>
<fileName/>
<fileDirectory/>
<lineNumber>0</lineNumber>
<contextFuncName/>
<contextNormFuncName/>
<inlineStackInfo>
<count>0</count>
<item_version>0</item_version>
</inlineStackInfo>
<originalName/>
<rtlName/>
<control/>
<opType/>
<implIndex/>
<coreName/>
<coreId>689</coreId>
</Obj>
<bitwidth>16</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="_22">
<Value>
<Obj>
<type>1</type>
<id>22</id>
<name>p_read19</name>
<fileName/>
<fileDirectory/>
<lineNumber>0</lineNumber>
<contextFuncName/>
<contextNormFuncName/>
<inlineStackInfo>
<count>0</count>
<item_version>0</item_version>
</inlineStackInfo>
<originalName/>
<rtlName/>
<control/>
<opType/>
<implIndex/>
<coreName/>
<coreId>49</coreId>
</Obj>
<bitwidth>16</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>
</ports>
<nodes class_id="8" tracking_level="0" version="0">
<count>89</count>
<item_version>0</item_version>
<item class_id="9" tracking_level="1" version="0" object_id="_23">
<Value>
<Obj>
<type>0</type>
<id>23</id>
<name>p_read_1</name>
<fileName/>
<fileDirectory/>
<lineNumber>0</lineNumber>
<contextFuncName/>
<contextNormFuncName/>
<inlineStackInfo>
<count>0</count>
<item_version>0</item_version>
</inlineStackInfo>
<originalName/>
<rtlName/>
<control/>
<opType/>
<implIndex/>
<coreName/>
<coreId>0</coreId>
</Obj>
<bitwidth>16</bitwidth>
</Value>
<oprand_edges>
<count>2</count>
<item_version>0</item_version>
<item>123</item>
<item>124</item>
</oprand_edges>
<opcode>read</opcode>
<m_Display>0</m_Display>
<m_isOnCriticalPath>0</m_isOnCriticalPath>
<m_isLCDNode>0</m_isLCDNode>
<m_isStartOfPath>0</m_isStartOfPath>
<m_delay>0.00</m_delay>
<m_topoIndex>1</m_topoIndex>
<m_clusterGroupNumber>-1</m_clusterGroupNumber>
</item>
<item class_id_reference="9" object_id="_24">
<Value>
<Obj>
<type>0</type>
<id>24</id>
<name>p_read_2</name>
<fileName/>
<fileDirectory/>
<lineNumber>0</lineNumber>
<contextFuncName/>
<contextNormFuncName/>
<inlineStackInfo>
<count>0</count>
<item_version>0</item_version>
</inlineStackInfo>
<originalName/>
<rtlName/>
<control/>
<opType/>
<implIndex/>
<coreName/>
<coreId>113</coreId>
</Obj>
<bitwidth>16</bitwidth>
</Value>
<oprand_edges>
<count>2</count>
<item_version>0</item_version>
<item>125</item>
<item>126</item>
</oprand_edges>
<opcode>read</opcode>
<m_Display>0</m_Display>
<m_isOnCriticalPath>0</m_isOnCriticalPath>
<m_isLCDNode>0</m_isLCDNode>
<m_isStartOfPath>0</m_isStartOfPath>
<m_delay>0.00</m_delay>
<m_topoIndex>2</m_topoIndex>
<m_clusterGroupNumber>-1</m_clusterGroupNumber>
</item>
<item class_id_reference="9" object_id="_25">
<Value>
<Obj>
<type>0</type>
<id>25</id>
<name>p_read_3</name>
<fileName/>
<fileDirectory/>
<lineNumber>0</lineNumber>
<contextFuncName/>
<contextNormFuncName/>
<inlineStackInfo>
<count>0</count>
<item_version>0</item_version>
</inlineStackInfo>
<originalName/>
<rtlName/>
<control/>
<opType/>
<implIndex/>
<coreName/>
<coreId>49</coreId>
</Obj>
<bitwidth>8</bitwidth>
</Value>
<oprand_edges>
<count>2</count>
<item_version>0</item_version>
<item>128</item>
<item>129</item>
</oprand_edges>
<opcode>read</opcode>
<m_Display>0</m_Display>
<m_isOnCriticalPath>0</m_isOnCriticalPath>
<m_isLCDNode>0</m_isLCDNode>
<m_isStartOfPath>0</m_isStartOfPath>
<m_delay>0.00</m_delay>
<m_topoIndex>6</m_topoIndex>
<m_clusterGroupNumber>-1</m_clusterGroupNumber>
</item>
<item class_id_reference="9" object_id="_26">
<Value>
<Obj>
<type>0</type>
<id>26</id>
<name>p_read_4</name>
<fileName/>
<fileDirectory/>
<lineNumber>0</lineNumber>
<contextFuncName/>
<contextNormFuncName/>
<inlineStackInfo>
<count>0</count>
<item_version>0</item_version>
</inlineStackInfo>
<originalName/>
<rtlName/>
<control/>
<opType/>
<implIndex/>
<coreName/>
<coreId>4294967295</coreId>
</Obj>
<bitwidth>8</bitwidth>
</Value>
<oprand_edges>
<count>2</count>
<item_version>0</item_version>
<item>130</item>
<item>131</item>
</oprand_edges>
<opcode>read</opcode>
<m_Display>0</m_Display>
<m_isOnCriticalPath>0</m_isOnCriticalPath>
<m_isLCDNode>0</m_isLCDNode>
<m_isStartOfPath>0</m_isStartOfPath>
<m_delay>0.00</m_delay>
<m_topoIndex>7</m_topoIndex>
<m_clusterGroupNumber>-1</m_clusterGroupNumber>
</item>
<item class_id_reference="9" object_id="_27">
<Value>
<Obj>
<type>0</type>
<id>27</id>
<name>p_read_5</name>
<fileName/>
<fileDirectory/>
<lineNumber>0</lineNumber>
<contextFuncName/>
<contextNormFuncName/>
<inlineStackInfo>
<count>0</count>
<item_version>0</item_version>
</inlineStackInfo>
<originalName/>
<rtlName/>
<control/>
<opType/>
<implIndex/>
<coreName/>
<coreId>737</coreId>
</Obj>
<bitwidth>8</bitwidth>
</Value>
<oprand_edges>
<count>2</count>
<item_version>0</item_version>
<item>132</item>
<item>133</item>
</oprand_edges>
<opcode>read</opcode>
<m_Display>0</m_Display>
<m_isOnCriticalPath>0</m_isOnCriticalPath>
<m_isLCDNode>0</m_isLCDNode>
<m_isStartOfPath>0</m_isStartOfPath>
<m_delay>0.00</m_delay>
<m_topoIndex>8</m_topoIndex>
<m_clusterGroupNumber>-1</m_clusterGroupNumber>
</item>
<item class_id_reference="9" object_id="_28">
<Value>
<Obj>
<type>0</type>
<id>28</id>
<name>p_read_6</name>
<fileName/>
<fileDirectory/>
<lineNumber>0</lineNumber>
<contextFuncName/>
<contextNormFuncName/>
<inlineStackInfo>
<count>0</count>
<item_version>0</item_version>
</inlineStackInfo>
<originalName/>
<rtlName/>
<control/>
<opType/>
<implIndex/>
<coreName/>
<coreId>4294967295</coreId>
</Obj>
<bitwidth>8</bitwidth>
</Value>
<oprand_edges>
<count>2</count>
<item_version>0</item_version>
<item>134</item>
<item>135</item>
</oprand_edges>
<opcode>read</opcode>
<m_Display>0</m_Display>
<m_isOnCriticalPath>0</m_isOnCriticalPath>
<m_isLCDNode>0</m_isLCDNode>
<m_isStartOfPath>0</m_isStartOfPath>
<m_delay>0.00</m_delay>
<m_topoIndex>9</m_topoIndex>
<m_clusterGroupNumber>-1</m_clusterGroupNumber>
</item>
<item class_id_reference="9" object_id="_29">
<Value>
<Obj>
<type>0</type>
<id>29</id>
<name>p_read_7</name>
<fileName/>
<fileDirectory/>
<lineNumber>0</lineNumber>
<contextFuncName/>
<contextNormFuncName/>
<inlineStackInfo>
<count>0</count>
<item_version>0</item_version>
</inlineStackInfo>
<originalName/>
<rtlName/>
<control/>
<opType/>
<implIndex/>
<coreName/>
<coreId>737</coreId>
</Obj>
<bitwidth>8</bitwidth>
</Value>
<oprand_edges>
<count>2</count>
<item_version>0</item_version>
<item>136</item>
<item>137</item>
</oprand_edges>
<opcode>read</opcode>
<m_Display>0</m_Display>
<m_isOnCriticalPath>0</m_isOnCriticalPath>
<m_isLCDNode>0</m_isLCDNode>
<m_isStartOfPath>0</m_isStartOfPath>
<m_delay>0.00</m_delay>
<m_topoIndex>10</m_topoIndex>
<m_clusterGroupNumber>-1</m_clusterGroupNumber>
</item>
<item class_id_reference="9" object_id="_30">
<Value>
<Obj>
<type>0</type>
<id>30</id>
<name>p_read_8</name>
<fileName/>
<fileDirectory/>
<lineNumber>0</lineNumber>
<contextFuncName/>
<contextNormFuncName/>
<inlineStackInfo>
<count>0</count>
<item_version>0</item_version>
</inlineStackInfo>
<originalName/>
<rtlName/>
<control/>
<opType/>
<implIndex/>
<coreName/>
<coreId>4294967295</coreId>
</Obj>
<bitwidth>8</bitwidth>
</Value>
<oprand_edges>
<count>2</count>
<item_version>0</item_version>
<item>138</item>
<item>139</item>
</oprand_edges>
<opcode>read</opcode>
<m_Display>0</m_Display>
<m_isOnCriticalPath>0</m_isOnCriticalPath>
<m_isLCDNode>0</m_isLCDNode>
<m_isStartOfPath>0</m_isStartOfPath>
<m_delay>0.00</m_delay>
<m_topoIndex>11</m_topoIndex>
<m_clusterGroupNumber>-1</m_clusterGroupNumber>
</item>
<item class_id_reference="9" object_id="_31">
<Value>
<Obj>
<type>0</type>
<id>31</id>
<name>p_read_9</name>
<fileName/>
<fileDirectory/>
<lineNumber>0</lineNumber>
<contextFuncName/>
<contextNormFuncName/>
<inlineStackInfo>
<count>0</count>
<item_version>0</item_version>
</inlineStackInfo>
<originalName/>
<rtlName/>
<control/>
<opType/>
<implIndex/>
<coreName/>
<coreId>737</coreId>
</Obj>
<bitwidth>8</bitwidth>
</Value>
<oprand_edges>
<count>2</count>
<item_version>0</item_version>
<item>140</item>
<item>141</item>
</oprand_edges>
<opcode>read</opcode>
<m_Display>0</m_Display>
<m_isOnCriticalPath>0</m_isOnCriticalPath>
<m_isLCDNode>0</m_isLCDNode>
<m_isStartOfPath>0</m_isStartOfPath>
<m_delay>0.00</m_delay>
<m_topoIndex>12</m_topoIndex>
<m_clusterGroupNumber>-1</m_clusterGroupNumber>
</item>
<item class_id_reference="9" object_id="_32">
<Value>
<Obj>
<type>0</type>
<id>32</id>
<name>p_read_10</name>
<fileName/>
<fileDirectory/>
<lineNumber>0</lineNumber>
<contextFuncName/>
<contextNormFuncName/>
<inlineStackInfo>
<count>0</count>
<item_version>0</item_version>
</inlineStackInfo>
<originalName/>
<rtlName/>
<control/>
<opType/>
<implIndex/>
<coreName/>
<coreId>4294967295</coreId>
</Obj>
<bitwidth>8</bitwidth>
</Value>
<oprand_edges>
<count>2</count>
<item_version>0</item_version>
<item>142</item>
<item>143</item>
</oprand_edges>
<opcode>read</opcode>
<m_Display>0</m_Display>
<m_isOnCriticalPath>0</m_isOnCriticalPath>
<m_isLCDNode>0</m_isLCDNode>
<m_isStartOfPath>0</m_isStartOfPath>
<m_delay>0.00</m_delay>
<m_topoIndex>13</m_topoIndex>
<m_clusterGroupNumber>-1</m_clusterGroupNumber>
</item>
<item class_id_reference="9" object_id="_33">
<Value>
<Obj>
<type>0</type>
<id>33</id>
<name>p_read_11</name>
<fileName/>
<fileDirectory/>
<lineNumber>0</lineNumber>
<contextFuncName/>
<contextNormFuncName/>
<inlineStackInfo>
<count>0</count>
<item_version>0</item_version>
</inlineStackInfo>
<originalName/>
<rtlName/>
<control/>
<opType/>
<implIndex/>
<coreName/>
<coreId>737</coreId>
</Obj>
<bitwidth>8</bitwidth>
</Value>
<oprand_edges>
<count>2</count>
<item_version>0</item_version>
<item>144</item>
<item>145</item>
</oprand_edges>
<opcode>read</opcode>
<m_Display>0</m_Display>
<m_isOnCriticalPath>0</m_isOnCriticalPath>
<m_isLCDNode>0</m_isLCDNode>
<m_isStartOfPath>0</m_isStartOfPath>
<m_delay>0.00</m_delay>
<m_topoIndex>14</m_topoIndex>
<m_clusterGroupNumber>-1</m_clusterGroupNumber>
</item>
<item class_id_reference="9" object_id="_34">
<Value>
<Obj>
<type>0</type>
<id>34</id>
<name>p_read_12</name>
<fileName/>
<fileDirectory/>
<lineNumber>0</lineNumber>
<contextFuncName/>
<contextNormFuncName/>
<inlineStackInfo>
<count>0</count>
<item_version>0</item_version>
</inlineStackInfo>
<originalName/>
<rtlName/>
<control/>
<opType/>
<implIndex/>
<coreName/>
<coreId>4294967295</coreId>
</Obj>
<bitwidth>8</bitwidth>
</Value>
<oprand_edges>
<count>2</count>
<item_version>0</item_version>
<item>146</item>
<item>147</item>
</oprand_edges>
<opcode>read</opcode>
<m_Display>0</m_Display>
<m_isOnCriticalPath>0</m_isOnCriticalPath>
<m_isLCDNode>0</m_isLCDNode>
<m_isStartOfPath>0</m_isStartOfPath>
<m_delay>0.00</m_delay>
<m_topoIndex>15</m_topoIndex>
<m_clusterGroupNumber>-1</m_clusterGroupNumber>
</item>
<item class_id_reference="9" object_id="_35">
<Value>
<Obj>
<type>0</type>
<id>35</id>
<name>p_read_13</name>
<fileName/>
<fileDirectory/>
<lineNumber>0</lineNumber>
<contextFuncName/>
<contextNormFuncName/>
<inlineStackInfo>
<count>0</count>
<item_version>0</item_version>
</inlineStackInfo>
<originalName/>
<rtlName/>
<control/>
<opType/>
<implIndex/>
<coreName/>
<coreId>12</coreId>
</Obj>
<bitwidth>8</bitwidth>
</Value>
<oprand_edges>
<count>2</count>
<item_version>0</item_version>
<item>148</item>
<item>149</item>
</oprand_edges>
<opcode>read</opcode>
<m_Display>0</m_Display>
<m_isOnCriticalPath>0</m_isOnCriticalPath>
<m_isLCDNode>0</m_isLCDNode>
<m_isStartOfPath>0</m_isStartOfPath>
<m_delay>0.00</m_delay>
<m_topoIndex>16</m_topoIndex>
<m_clusterGroupNumber>-1</m_clusterGroupNumber>
</item>
<item class_id_reference="9" object_id="_36">
<Value>
<Obj>
<type>0</type>
<id>36</id>
<name>p_read_14</name>
<fileName/>
<fileDirectory/>
<lineNumber>0</lineNumber>
<contextFuncName/>
<contextNormFuncName/>
<inlineStackInfo>
<count>0</count>
<item_version>0</item_version>
</inlineStackInfo>
<originalName/>
<rtlName/>
<control/>
<opType/>
<implIndex/>
<coreName/>
<coreId>3578876608</coreId>
</Obj>
<bitwidth>8</bitwidth>
</Value>
<oprand_edges>
<count>2</count>
<item_version>0</item_version>
<item>150</item>
<item>151</item>
</oprand_edges>
<opcode>read</opcode>
<m_Display>0</m_Display>
<m_isOnCriticalPath>0</m_isOnCriticalPath>
<m_isLCDNode>0</m_isLCDNode>
<m_isStartOfPath>0</m_isStartOfPath>
<m_delay>0.00</m_delay>
<m_topoIndex>17</m_topoIndex>
<m_clusterGroupNumber>-1</m_clusterGroupNumber>
</item>
<item class_id_reference="9" object_id="_37">
<Value>
<Obj>
<type>0</type>
<id>37</id>
<name>p_read_15</name>
<fileName/>
<fileDirectory/>
<lineNumber>0</lineNumber>
<contextFuncName/>
<contextNormFuncName/>
<inlineStackInfo>
<count>0</count>
<item_version>0</item_version>
</inlineStackInfo>
<originalName/>
<rtlName/>
<control/>
<opType/>
<implIndex/>
<coreName/>
<coreId>785</coreId>
</Obj>
<bitwidth>8</bitwidth>
</Value>
<oprand_edges>
<count>2</count>
<item_version>0</item_version>
<item>152</item>
<item>153</item>
</oprand_edges>
<opcode>read</opcode>
<m_Display>0</m_Display>
<m_isOnCriticalPath>0</m_isOnCriticalPath>
<m_isLCDNode>0</m_isLCDNode>
<m_isStartOfPath>0</m_isStartOfPath>
<m_delay>0.00</m_delay>
<m_topoIndex>18</m_topoIndex>
<m_clusterGroupNumber>-1</m_clusterGroupNumber>
</item>
<item class_id_reference="9" object_id="_38">
<Value>
<Obj>
<type>0</type>
<id>38</id>
<name>p_read_16</name>
<fileName/>
<fileDirectory/>
<lineNumber>0</lineNumber>
<contextFuncName/>
<contextNormFuncName/>
<inlineStackInfo>
<count>0</count>
<item_version>0</item_version>
</inlineStackInfo>
<originalName/>
<rtlName/>
<control/>
<opType/>
<implIndex/>
<coreName/>
<coreId>132</coreId>
</Obj>
<bitwidth>8</bitwidth>
</Value>
<oprand_edges>
<count>2</count>
<item_version>0</item_version>
<item>154</item>
<item>155</item>
</oprand_edges>
<opcode>read</opcode>
<m_Display>0</m_Display>
<m_isOnCriticalPath>0</m_isOnCriticalPath>
<m_isLCDNode>0</m_isLCDNode>
<m_isStartOfPath>0</m_isStartOfPath>
<m_delay>0.00</m_delay>
<m_topoIndex>19</m_topoIndex>
<m_clusterGroupNumber>-1</m_clusterGroupNumber>
</item>
<item class_id_reference="9" object_id="_39">
<Value>
<Obj>
<type>0</type>
<id>39</id>
<name>p_read_17</name>
<fileName/>
<fileDirectory/>
<lineNumber>0</lineNumber>
<contextFuncName/>
<contextNormFuncName/>
<inlineStackInfo>
<count>0</count>
<item_version>0</item_version>
</inlineStackInfo>
<originalName/>
<rtlName/>
<control/>
<opType/>
<implIndex/>
<coreName/>
<coreId>785</coreId>
</Obj>
<bitwidth>8</bitwidth>
</Value>
<oprand_edges>
<count>2</count>
<item_version>0</item_version>
<item>156</item>
<item>157</item>
</oprand_edges>
<opcode>read</opcode>
<m_Display>0</m_Display>
<m_isOnCriticalPath>0</m_isOnCriticalPath>
<m_isLCDNode>0</m_isLCDNode>
<m_isStartOfPath>0</m_isStartOfPath>
<m_delay>0.00</m_delay>
<m_topoIndex>20</m_topoIndex>
<m_clusterGroupNumber>-1</m_clusterGroupNumber>
</item>
<item class_id_reference="9" object_id="_40">
<Value>
<Obj>
<type>0</type>
<id>40</id>
<name>p_read_18</name>
<fileName/>
<fileDirectory/>
<lineNumber>0</lineNumber>
<contextFuncName/>
<contextNormFuncName/>
<inlineStackInfo>
<count>0</count>
<item_version>0</item_version>
</inlineStackInfo>
<originalName/>
<rtlName/>
<control/>
<opType/>
<implIndex/>
<coreName/>
<coreId>4294967295</coreId>
</Obj>
<bitwidth>8</bitwidth>
</Value>
<oprand_edges>
<count>2</count>
<item_version>0</item_version>
<item>158</item>
<item>159</item>
</oprand_edges>
<opcode>read</opcode>
<m_Display>0</m_Display>
<m_isOnCriticalPath>0</m_isOnCriticalPath>
<m_isLCDNode>0</m_isLCDNode>
<m_isStartOfPath>0</m_isStartOfPath>
<m_delay>0.00</m_delay>
<m_topoIndex>21</m_topoIndex>
<m_clusterGroupNumber>-1</m_clusterGroupNumber>
</item>
<item class_id_reference="9" object_id="_41">
<Value>
<Obj>
<type>0</type>
<id>41</id>
<name>p_read_19</name>
<fileName/>
<fileDirectory/>
<lineNumber>0</lineNumber>
<contextFuncName/>
<contextNormFuncName/>
<inlineStackInfo>
<count>0</count>
<item_version>0</item_version>
</inlineStackInfo>
<originalName/>
<rtlName/>
<control/>
<opType/>
<implIndex/>
<coreName/>
<coreId>785</coreId>
</Obj>
<bitwidth>8</bitwidth>
</Value>
<oprand_edges>
<count>2</count>
<item_version>0</item_version>
<item>160</item>
<item>161</item>
</oprand_edges>
<opcode>read</opcode>
<m_Display>0</m_Display>
<m_isOnCriticalPath>0</m_isOnCriticalPath>
<m_isLCDNode>0</m_isLCDNode>
<m_isStartOfPath>0</m_isStartOfPath>
<m_delay>0.00</m_delay>
<m_topoIndex>22</m_topoIndex>
<m_clusterGroupNumber>-1</m_clusterGroupNumber>
</item>
<item class_id_reference="9" object_id="_42">
<Value>
<Obj>
<type>0</type>
<id>42</id>
<name>p_read_20</name>
<fileName/>
<fileDirectory/>
<lineNumber>0</lineNumber>
<contextFuncName/>
<contextNormFuncName/>
<inlineStackInfo>
<count>0</count>
<item_version>0</item_version>
</inlineStackInfo>
<originalName/>
<rtlName/>
<control/>
<opType/>
<implIndex/>
<coreName/>
<coreId>8</coreId>
</Obj>
<bitwidth>8</bitwidth>
</Value>
<oprand_edges>
<count>2</count>
<item_version>0</item_version>
<item>162</item>
<item>163</item>
</oprand_edges>
<opcode>read</opcode>
<m_Display>0</m_Display>
<m_isOnCriticalPath>0</m_isOnCriticalPath>
<m_isLCDNode>0</m_isLCDNode>
<m_isStartOfPath>0</m_isStartOfPath>
<m_delay>0.00</m_delay>
<m_topoIndex>23</m_topoIndex>
<m_clusterGroupNumber>-1</m_clusterGroupNumber>
</item>
<item class_id_reference="9" object_id="_43">
<Value>
<Obj>
<type>0</type>
<id>45</id>
<name>cast</name>
<fileName/>
<fileDirectory/>
<lineNumber>0</lineNumber>
<contextFuncName/>
<contextNormFuncName/>
<inlineStackInfo>
<count>0</count>
<item_version>0</item_version>
</inlineStackInfo>
<originalName/>
<rtlName>grp_fu_589_p00</rtlName>
<control/>
<opType/>
<implIndex/>
<coreName/>
<coreId>785</coreId>
</Obj>
<bitwidth>32</bitwidth>
</Value>
<oprand_edges>
<count>1</count>
<item_version>0</item_version>
<item>164</item>
</oprand_edges>
<opcode>zext</opcode>
<m_Display>0</m_Display>
<m_isOnCriticalPath>0</m_isOnCriticalPath>
<m_isLCDNode>0</m_isLCDNode>
<m_isStartOfPath>0</m_isStartOfPath>
<m_delay>0.00</m_delay>
<m_topoIndex>3</m_topoIndex>
<m_clusterGroupNumber>-1</m_clusterGroupNumber>
</item>
<item class_id_reference="9" object_id="_44">
<Value>
<Obj>
<type>0</type>
<id>46</id>
<name>cast1</name>
<fileName/>
<fileDirectory/>
<lineNumber>0</lineNumber>
<contextFuncName/>
<contextNormFuncName/>
<inlineStackInfo>
<count>0</count>
<item_version>0</item_version>
</inlineStackInfo>
<originalName/>
<rtlName>grp_fu_589_p10</rtlName>
<control/>
<opType/>
<implIndex/>
<coreName/>
<coreId>132</coreId>
</Obj>
<bitwidth>32</bitwidth>
</Value>
<oprand_edges>
<count>1</count>
<item_version>0</item_version>
<item>165</item>
</oprand_edges>
<opcode>zext</opcode>
<m_Display>0</m_Display>
<m_isOnCriticalPath>0</m_isOnCriticalPath>
<m_isLCDNode>0</m_isLCDNode>
<m_isStartOfPath>0</m_isStartOfPath>
<m_delay>0.00</m_delay>
<m_topoIndex>4</m_topoIndex>
<m_clusterGroupNumber>-1</m_clusterGroupNumber>
</item>
<item class_id_reference="9" object_id="_45">
<Value>
<Obj>
<type>0</type>
<id>47</id>
<name>bound</name>
<fileName/>
<fileDirectory/>
<lineNumber>0</lineNumber>
<contextFuncName/>
<contextNormFuncName/>
<inlineStackInfo>
<count>0</count>
<item_version>0</item_version>
</inlineStackInfo>
<originalName/>
<rtlName>mul_mul_16ns_16ns_32_4_1_U57</rtlName>
<control>auto</control>
<opType>mul</opType>
<implIndex>dsp</implIndex>
<coreName>DSP48</coreName>
<coreId>119</coreId>
</Obj>
<bitwidth>32</bitwidth>
</Value>
<oprand_edges>
<count>2</count>
<item_version>0</item_version>
<item>166</item>
<item>167</item>
</oprand_edges>
<opcode>mul</opcode>
<m_Display>0</m_Display>
<m_isOnCriticalPath>0</m_isOnCriticalPath>
<m_isLCDNode>0</m_isLCDNode>
<m_isStartOfPath>0</m_isStartOfPath>
<m_delay>1.82</m_delay>
<m_topoIndex>5</m_topoIndex>
<m_clusterGroupNumber>-1</m_clusterGroupNumber>
</item>
<item class_id_reference="9" object_id="_46">
<Value>
<Obj>
<type>0</type>
<id>48</id>
<name>br_ln92</name>
<fileName>/home/willychiang/Desktop/PYNQ-HelloWorld/boards/ip/vitis_lib/vision/L1/include/imgproc/xf_colorthresholding.hpp</fileName>
<fileDirectory>..</fileDirectory>
<lineNumber>92</lineNumber>
<contextFuncName>xFInRange&lt;9, 0, 2160, 3840, 15, 0, 1, 9, 1, 3&gt;</contextFuncName>
<contextNormFuncName>xFInRange_9_0_2160_3840_15_0_1_9_1_3_s</contextNormFuncName>
<inlineStackInfo>
<count>1</count>
<item_version>0</item_version>
<item class_id="11" tracking_level="0" version="0">
<first>/home/willychiang/Desktop/PYNQ-HelloWorld/boards/ip</first>
<second class_id="12" tracking_level="0" version="0">
<count>2</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>/home/willychiang/Desktop/PYNQ-HelloWorld/boards/ip/vitis_lib/vision/L1/include/imgproc/xf_colorthresholding.hpp</first>
<second>colorthresholding&lt;9, 0, 3, 2160, 3840, 1&gt;</second>
</first>
<second>155</second>
</item>
<item>
<first>
<first>/home/willychiang/Desktop/PYNQ-HelloWorld/boards/ip/vitis_lib/vision/L1/include/imgproc/xf_colorthresholding.hpp</first>
<second>xFInRange&lt;9, 0, 2160, 3840, 15, 0, 1, 9, 1, 3&gt;</second>
</first>
<second>92</second>
</item>
</second>
</item>
</inlineStackInfo>
<originalName/>
<rtlName/>
<control/>
<opType/>
<implIndex/>
<coreName/>
<coreId>3579476064</coreId>
</Obj>
<bitwidth>0</bitwidth>
</Value>
<oprand_edges>
<count>1</count>
<item_version>0</item_version>
<item>168</item>
</oprand_edges>
<opcode>br</opcode>
<m_Display>0</m_Display>
<m_isOnCriticalPath>0</m_isOnCriticalPath>
<m_isLCDNode>0</m_isLCDNode>
<m_isStartOfPath>0</m_isStartOfPath>
<m_delay>1.29</m_delay>
<m_topoIndex>24</m_topoIndex>
<m_clusterGroupNumber>-1</m_clusterGroupNumber>
</item>
<item class_id_reference="9" object_id="_47">
<Value>
<Obj>
<type>0</type>
<id>50</id>
<name>indvar_flatten</name>
<fileName>/home/willychiang/Desktop/PYNQ-HelloWorld/boards/ip/vitis_lib/vision/L1/include/imgproc/xf_colorthresholding.hpp</fileName>
<fileDirectory>..</fileDirectory>
<lineNumber>92</lineNumber>
<contextFuncName>xFInRange&lt;9, 0, 2160, 3840, 15, 0, 1, 9, 1, 3&gt;</contextFuncName>
<contextNormFuncName>xFInRange_9_0_2160_3840_15_0_1_9_1_3_s</contextNormFuncName>
<inlineStackInfo>
<count>1</count>
<item_version>0</item_version>
<item>
<first>/home/willychiang/Desktop/PYNQ-HelloWorld/boards/ip</first>
<second>
<count>2</count>
<item_version>0</item_version>
<item>
<first>
<first>/home/willychiang/Desktop/PYNQ-HelloWorld/boards/ip/vitis_lib/vision/L1/include/imgproc/xf_colorthresholding.hpp</first>
<second>colorthresholding&lt;9, 0, 3, 2160, 3840, 1&gt;</second>
</first>
<second>155</second>
</item>
<item>
<first>
<first>/home/willychiang/Desktop/PYNQ-HelloWorld/boards/ip/vitis_lib/vision/L1/include/imgproc/xf_colorthresholding.hpp</first>
<second>xFInRange&lt;9, 0, 2160, 3840, 15, 0, 1, 9, 1, 3&gt;</second>
</first>
<second>92</second>
</item>
</second>
</item>
</inlineStackInfo>
<originalName/>
<rtlName/>
<control/>
<opType/>
<implIndex/>
<coreName/>
<coreId>785</coreId>
</Obj>
<bitwidth>32</bitwidth>
</Value>
<oprand_edges>
<count>4</count>
<item_version>0</item_version>
<item>170</item>
<item>171</item>
<item>172</item>
<item>173</item>
</oprand_edges>
<opcode>phi</opcode>
<m_Display>0</m_Display>
<m_isOnCriticalPath>0</m_isOnCriticalPath>
<m_isLCDNode>0</m_isLCDNode>
<m_isStartOfPath>0</m_isStartOfPath>
<m_delay>0.00</m_delay>
<m_topoIndex>25</m_topoIndex>
<m_clusterGroupNumber>-1</m_clusterGroupNumber>
</item>
<item class_id_reference="9" object_id="_48">
<Value>
<Obj>
<type>0</type>
<id>51</id>
<name>add_ln92</name>
<fileName>/home/willychiang/Desktop/PYNQ-HelloWorld/boards/ip/vitis_lib/vision/L1/include/imgproc/xf_colorthresholding.hpp</fileName>
<fileDirectory>..</fileDirectory>
<lineNumber>92</lineNumber>
<contextFuncName>xFInRange&lt;9, 0, 2160, 3840, 15, 0, 1, 9, 1, 3&gt;</contextFuncName>
<contextNormFuncName>xFInRange_9_0_2160_3840_15_0_1_9_1_3_s</contextNormFuncName>
<inlineStackInfo>
<count>1</count>
<item_version>0</item_version>
<item>
<first>/home/willychiang/Desktop/PYNQ-HelloWorld/boards/ip</first>
<second>
<count>2</count>
<item_version>0</item_version>
<item>
<first>
<first>/home/willychiang/Desktop/PYNQ-HelloWorld/boards/ip/vitis_lib/vision/L1/include/imgproc/xf_colorthresholding.hpp</first>
<second>colorthresholding&lt;9, 0, 3, 2160, 3840, 1&gt;</second>
</first>
<second>155</second>
</item>
<item>
<first>
<first>/home/willychiang/Desktop/PYNQ-HelloWorld/boards/ip/vitis_lib/vision/L1/include/imgproc/xf_colorthresholding.hpp</first>
<second>xFInRange&lt;9, 0, 2160, 3840, 15, 0, 1, 9, 1, 3&gt;</second>
</first>
<second>92</second>
</item>
</second>
</item>
</inlineStackInfo>
<originalName/>
<rtlName>add_ln92_fu_248_p2</rtlName>
<control>auto</control>
<opType>add</opType>
<implIndex>fabric</implIndex>
<coreName>Adder</coreName>
<coreId>1</coreId>
</Obj>
<bitwidth>32</bitwidth>
</Value>
<oprand_edges>
<count>2</count>
<item_version>0</item_version>
<item>174</item>
<item>176</item>
</oprand_edges>
<opcode>add</opcode>
<m_Display>0</m_Display>
<m_isOnCriticalPath>0</m_isOnCriticalPath>
<m_isLCDNode>0</m_isLCDNode>
<m_isStartOfPath>0</m_isStartOfPath>
<m_delay>1.89</m_delay>
<m_topoIndex>26</m_topoIndex>
<m_clusterGroupNumber>-1</m_clusterGroupNumber>
</item>
<item class_id_reference="9" object_id="_49">
<Value>
<Obj>
<type>0</type>
<id>52</id>
<name>icmp_ln92</name>
<fileName>/home/willychiang/Desktop/PYNQ-HelloWorld/boards/ip/vitis_lib/vision/L1/include/imgproc/xf_colorthresholding.hpp</fileName>
<fileDirectory>..</fileDirectory>
<lineNumber>92</lineNumber>
<contextFuncName>xFInRange&lt;9, 0, 2160, 3840, 15, 0, 1, 9, 1, 3&gt;</contextFuncName>
<contextNormFuncName>xFInRange_9_0_2160_3840_15_0_1_9_1_3_s</contextNormFuncName>
<inlineStackInfo>
<count>1</count>
<item_version>0</item_version>
<item>
<first>/home/willychiang/Desktop/PYNQ-HelloWorld/boards/ip</first>
<second>
<count>2</count>
<item_version>0</item_version>
<item>
<first>
<first>/home/willychiang/Desktop/PYNQ-HelloWorld/boards/ip/vitis_lib/vision/L1/include/imgproc/xf_colorthresholding.hpp</first>
<second>colorthresholding&lt;9, 0, 3, 2160, 3840, 1&gt;</second>
</first>
<second>155</second>
</item>
<item>
<first>
<first>/home/willychiang/Desktop/PYNQ-HelloWorld/boards/ip/vitis_lib/vision/L1/include/imgproc/xf_colorthresholding.hpp</first>
<second>xFInRange&lt;9, 0, 2160, 3840, 15, 0, 1, 9, 1, 3&gt;</second>
</first>
<second>92</second>
</item>
</second>
</item>
</inlineStackInfo>
<originalName/>
<rtlName>icmp_ln92_fu_254_p2</rtlName>
<control/>
<opType>icmp</opType>
<implIndex/>
<coreName/>
<coreId>785</coreId>
</Obj>
<bitwidth>1</bitwidth>
</Value>
<oprand_edges>
<count>2</count>
<item_version>0</item_version>
<item>177</item>
<item>178</item>
</oprand_edges>
<opcode>icmp</opcode>
<m_Display>0</m_Display>
<m_isOnCriticalPath>0</m_isOnCriticalPath>
<m_isLCDNode>0</m_isLCDNode>
<m_isStartOfPath>0</m_isStartOfPath>
<m_delay>1.96</m_delay>
<m_topoIndex>27</m_topoIndex>
<m_clusterGroupNumber>-1</m_clusterGroupNumber>
</item>
<item class_id_reference="9" object_id="_50">
<Value>
<Obj>
<type>0</type>
<id>53</id>
<name>br_ln92</name>
<fileName>/home/willychiang/Desktop/PYNQ-HelloWorld/boards/ip/vitis_lib/vision/L1/include/imgproc/xf_colorthresholding.hpp</fileName>
<fileDirectory>..</fileDirectory>
<lineNumber>92</lineNumber>
<contextFuncName>xFInRange&lt;9, 0, 2160, 3840, 15, 0, 1, 9, 1, 3&gt;</contextFuncName>
<contextNormFuncName>xFInRange_9_0_2160_3840_15_0_1_9_1_3_s</contextNormFuncName>
<inlineStackInfo>
<count>1</count>
<item_version>0</item_version>
<item>
<first>/home/willychiang/Desktop/PYNQ-HelloWorld/boards/ip</first>
<second>
<count>2</count>
<item_version>0</item_version>
<item>
<first>
<first>/home/willychiang/Desktop/PYNQ-HelloWorld/boards/ip/vitis_lib/vision/L1/include/imgproc/xf_colorthresholding.hpp</first>
<second>colorthresholding&lt;9, 0, 3, 2160, 3840, 1&gt;</second>
</first>
<second>155</second>
</item>
<item>
<first>
<first>/home/willychiang/Desktop/PYNQ-HelloWorld/boards/ip/vitis_lib/vision/L1/include/imgproc/xf_colorthresholding.hpp</first>
<second>xFInRange&lt;9, 0, 2160, 3840, 15, 0, 1, 9, 1, 3&gt;</second>
</first>
<second>92</second>
</item>
</second>
</item>
</inlineStackInfo>
<originalName/>
<rtlName/>
<control/>
<opType/>
<implIndex/>
<coreName/>
<coreId>132</coreId>
</Obj>
<bitwidth>0</bitwidth>
</Value>
<oprand_edges>
<count>3</count>
<item_version>0</item_version>
<item>179</item>
<item>180</item>
<item>181</item>
</oprand_edges>
<opcode>br</opcode>
<m_Display>0</m_Display>
<m_isOnCriticalPath>0</m_isOnCriticalPath>
<m_isLCDNode>0</m_isLCDNode>
<m_isStartOfPath>0</m_isStartOfPath>
<m_delay>0.00</m_delay>
<m_topoIndex>28</m_topoIndex>
<m_clusterGroupNumber>-1</m_clusterGroupNumber>
</item>
<item class_id_reference="9" object_id="_51">
<Value>
<Obj>
<type>0</type>
<id>59</id>
<name>tmp_V</name>
<fileName>/tools/Xilinx/Vitis_HLS/2020.2/common/technology/autopilot/hls_stream_39.h</fileName>
<fileDirectory>..</fileDirectory>
<lineNumber>145</lineNumber>
<contextFuncName>read</contextFuncName>
<contextNormFuncName>read</contextNormFuncName>
<inlineStackInfo>
<count>1</count>
<item_version>0</item_version>
<item>
<first>/home/willychiang/Desktop/PYNQ-HelloWorld/boards/ip</first>
<second>
<count>1</count>
<item_version>0</item_version>
<item>
<first>
<first>/tools/Xilinx/Vitis_HLS/2020.2/common/technology/autopilot/hls_stream_39.h</first>
<second>read</second>
</first>
<second>145</second>
</item>
</second>
</item>
</inlineStackInfo>
<originalName>tmp.V</originalName>
<rtlName/>
<control>auto</control>
<opType>fifo</opType>
<implIndex>srl</implIndex>
<coreName>FIFO_SRL</coreName>
<coreId>81</coreId>
</Obj>
<bitwidth>24</bitwidth>
</Value>
<oprand_edges>
<count>2</count>
<item_version>0</item_version>
<item>183</item>
<item>184</item>
</oprand_edges>
<opcode>read</opcode>
<m_Display>0</m_Display>
<m_isOnCriticalPath>0</m_isOnCriticalPath>
<m_isLCDNode>0</m_isLCDNode>
<m_isStartOfPath>0</m_isStartOfPath>
<m_delay>3.40</m_delay>
<m_topoIndex>29</m_topoIndex>
<m_clusterGroupNumber>-1</m_clusterGroupNumber>
</item>
<item class_id_reference="9" object_id="_52">
<Value>
<Obj>
<type>0</type>
<id>60</id>
<name>tmp_val1_V</name>
<fileName>/tools/Xilinx/Vitis_HLS/2020.2/common/technology/autopilot/ap_int_ref.h</fileName>
<fileDirectory>..</fileDirectory>
<lineNumber>674</lineNumber>
<contextFuncName>get</contextFuncName>
<contextNormFuncName>get</contextNormFuncName>
<inlineStackInfo>
<count>1</count>
<item_version>0</item_version>
<item>
<first>/home/willychiang/Desktop/PYNQ-HelloWorld/boards/ip</first>
<second>
<count>1</count>
<item_version>0</item_version>
<item>
<first>
<first>/tools/Xilinx/Vitis_HLS/2020.2/common/technology/autopilot/ap_int_ref.h</first>
<second>get</second>
</first>
<second>674</second>
</item>
</second>
</item>
</inlineStackInfo>
<originalName>tmp_val1.V</originalName>
<rtlName>tmp_val1_V_fu_259_p1</rtlName>
<control/>
<opType/>
<implIndex/>
<coreName/>
<coreId>344</coreId>
</Obj>
<bitwidth>8</bitwidth>
</Value>
<oprand_edges>
<count>1</count>
<item_version>0</item_version>
<item>185</item>
</oprand_edges>
<opcode>trunc</opcode>
<m_Display>0</m_Display>
<m_isOnCriticalPath>0</m_isOnCriticalPath>
<m_isLCDNode>0</m_isLCDNode>
<m_isStartOfPath>0</m_isStartOfPath>
<m_delay>0.00</m_delay>
<m_topoIndex>30</m_topoIndex>
<m_clusterGroupNumber>-1</m_clusterGroupNumber>
</item>
<item class_id_reference="9" object_id="_53">
<Value>
<Obj>
<type>0</type>
<id>61</id>
<name>tmp_val1_V_1</name>
<fileName>/tools/Xilinx/Vitis_HLS/2020.2/common/technology/autopilot/ap_int_ref.h</fileName>
<fileDirectory>..</fileDirectory>
<lineNumber>674</lineNumber>
<contextFuncName>get</contextFuncName>
<contextNormFuncName>get</contextNormFuncName>
<inlineStackInfo>
<count>1</count>
<item_version>0</item_version>
<item>
<first>/home/willychiang/Desktop/PYNQ-HelloWorld/boards/ip</first>
<second>
<count>1</count>
<item_version>0</item_version>
<item>
<first>
<first>/tools/Xilinx/Vitis_HLS/2020.2/common/technology/autopilot/ap_int_ref.h</first>
<second>get</second>
</first>
<second>674</second>
</item>
</second>
</item>
</inlineStackInfo>
<originalName>tmp_val1.V</originalName>
<rtlName>tmp_val1_V_1_fu_263_p4</rtlName>
<control/>
<opType/>
<implIndex/>
<coreName/>
<coreId>817</coreId>
</Obj>
<bitwidth>8</bitwidth>
</Value>
<oprand_edges>
<count>4</count>
<item_version>0</item_version>
<item>187</item>
<item>188</item>
<item>190</item>
<item>192</item>
</oprand_edges>
<opcode>partselect</opcode>
<m_Display>0</m_Display>
<m_isOnCriticalPath>0</m_isOnCriticalPath>
<m_isLCDNode>0</m_isLCDNode>
<m_isStartOfPath>0</m_isStartOfPath>
<m_delay>0.00</m_delay>
<m_topoIndex>31</m_topoIndex>
<m_clusterGroupNumber>-1</m_clusterGroupNumber>
</item>
<item class_id_reference="9" object_id="_54">
<Value>
<Obj>
<type>0</type>
<id>62</id>
<name>tmp_val1_V_2</name>
<fileName>/tools/Xilinx/Vitis_HLS/2020.2/common/technology/autopilot/ap_int_ref.h</fileName>
<fileDirectory>..</fileDirectory>
<lineNumber>674</lineNumber>
<contextFuncName>get</contextFuncName>
<contextNormFuncName>get</contextNormFuncName>
<inlineStackInfo>
<count>1</count>
<item_version>0</item_version>
<item>
<first>/home/willychiang/Desktop/PYNQ-HelloWorld/boards/ip</first>
<second>
<count>1</count>
<item_version>0</item_version>
<item>
<first>
<first>/tools/Xilinx/Vitis_HLS/2020.2/common/technology/autopilot/ap_int_ref.h</first>
<second>get</second>
</first>
<second>674</second>
</item>
</second>
</item>
</inlineStackInfo>
<originalName>tmp_val1.V</originalName>
<rtlName>tmp_val1_V_2_fu_273_p4</rtlName>
<control/>
<opType/>
<implIndex/>
<coreName/>
<coreId>833</coreId>
</Obj>
<bitwidth>8</bitwidth>
</Value>
<oprand_edges>
<count>4</count>
<item_version>0</item_version>
<item>193</item>
<item>194</item>
<item>196</item>
<item>198</item>
</oprand_edges>
<opcode>partselect</opcode>
<m_Display>0</m_Display>
<m_isOnCriticalPath>0</m_isOnCriticalPath>
<m_isLCDNode>0</m_isLCDNode>
<m_isStartOfPath>0</m_isStartOfPath>
<m_delay>0.00</m_delay>
<m_topoIndex>32</m_topoIndex>
<m_clusterGroupNumber>-1</m_clusterGroupNumber>
</item>
<item class_id_reference="9" object_id="_55">
<Value>
<Obj>
<type>0</type>
<id>63</id>
<name>icmp_ln56</name>
<fileName>/home/willychiang/Desktop/PYNQ-HelloWorld/boards/ip/vitis_lib/vision/L1/include/imgproc/xf_inrange.hpp</fileName>
<fileDirectory>..</fileDirectory>
<lineNumber>56</lineNumber>
<contextFuncName>inrangeproc&lt;9, 1, 15, 0, 9, 1&gt;</contextFuncName>
<contextNormFuncName>inrangeproc_9_1_15_0_9_1_s</contextNormFuncName>
<inlineStackInfo>
<count>1</count>
<item_version>0</item_version>
<item>
<first>/home/willychiang/Desktop/PYNQ-HelloWorld/boards/ip</first>
<second>
<count>1</count>
<item_version>0</item_version>
<item>
<first>
<first>/home/willychiang/Desktop/PYNQ-HelloWorld/boards/ip/vitis_lib/vision/L1/include/imgproc/xf_inrange.hpp</first>
<second>inrangeproc&lt;9, 1, 15, 0, 9, 1&gt;</second>
</first>
<second>56</second>
</item>
</second>
</item>
</inlineStackInfo>
<originalName/>
<rtlName>icmp_ln56_fu_283_p2</rtlName>
<control/>
<opType>icmp</opType>
<implIndex/>
<coreName/>
<coreId>785</coreId>
</Obj>
<bitwidth>1</bitwidth>
</Value>
<oprand_edges>
<count>2</count>
<item_version>0</item_version>
<item>199</item>
<item>200</item>
</oprand_edges>
<opcode>icmp</opcode>
<m_Display>0</m_Display>
<m_isOnCriticalPath>0</m_isOnCriticalPath>
<m_isLCDNode>0</m_isLCDNode>
<m_isStartOfPath>0</m_isStartOfPath>
<m_delay>1.31</m_delay>
<m_topoIndex>33</m_topoIndex>
<m_clusterGroupNumber>-1</m_clusterGroupNumber>
</item>
<item class_id_reference="9" object_id="_56">
<Value>
<Obj>
<type>0</type>
<id>64</id>
<name>xor_ln56</name>
<fileName>/home/willychiang/Desktop/PYNQ-HelloWorld/boards/ip/vitis_lib/vision/L1/include/imgproc/xf_inrange.hpp</fileName>
<fileDirectory>..</fileDirectory>
<lineNumber>56</lineNumber>
<contextFuncName>inrangeproc&lt;9, 1, 15, 0, 9, 1&gt;</contextFuncName>
<contextNormFuncName>inrangeproc_9_1_15_0_9_1_s</contextNormFuncName>
<inlineStackInfo>
<count>1</count>
<item_version>0</item_version>
<item>
<first>/home/willychiang/Desktop/PYNQ-HelloWorld/boards/ip</first>
<second>
<count>1</count>
<item_version>0</item_version>
<item>
<first>
<first>/home/willychiang/Desktop/PYNQ-HelloWorld/boards/ip/vitis_lib/vision/L1/include/imgproc/xf_inrange.hpp</first>
<second>inrangeproc&lt;9, 1, 15, 0, 9, 1&gt;</second>
</first>
<second>56</second>
</item>
</second>
</item>
</inlineStackInfo>
<originalName/>
<rtlName>xor_ln56_fu_288_p2</rtlName>
<control/>
<opType>xor</opType>
<implIndex/>
<coreName/>
<coreId>12</coreId>
</Obj>
<bitwidth>1</bitwidth>
</Value>
<oprand_edges>
<count>2</count>
<item_version>0</item_version>
<item>201</item>
<item>203</item>
</oprand_edges>
<opcode>xor</opcode>
<m_Display>0</m_Display>
<m_isOnCriticalPath>0</m_isOnCriticalPath>
<m_isLCDNode>0</m_isLCDNode>
<m_isStartOfPath>0</m_isStartOfPath>
<m_delay>0.00</m_delay>
<m_topoIndex>34</m_topoIndex>
<m_clusterGroupNumber>1</m_clusterGroupNumber>
</item>
<item class_id_reference="9" object_id="_57">
<Value>
<Obj>
<type>0</type>
<id>65</id>
<name>icmp_ln56_1</name>
<fileName>/home/willychiang/Desktop/PYNQ-HelloWorld/boards/ip/vitis_lib/vision/L1/include/imgproc/xf_inrange.hpp</fileName>
<fileDirectory>..</fileDirectory>
<lineNumber>56</lineNumber>
<contextFuncName>inrangeproc&lt;9, 1, 15, 0, 9, 1&gt;</contextFuncName>
<contextNormFuncName>inrangeproc_9_1_15_0_9_1_s</contextNormFuncName>
<inlineStackInfo>
<count>1</count>
<item_version>0</item_version>
<item>
<first>/home/willychiang/Desktop/PYNQ-HelloWorld/boards/ip</first>
<second>
<count>1</count>
<item_version>0</item_version>
<item>
<first>
<first>/home/willychiang/Desktop/PYNQ-HelloWorld/boards/ip/vitis_lib/vision/L1/include/imgproc/xf_inrange.hpp</first>
<second>inrangeproc&lt;9, 1, 15, 0, 9, 1&gt;</second>
</first>
<second>56</second>
</item>
</second>
</item>
</inlineStackInfo>
<originalName/>
<rtlName>icmp_ln56_1_fu_294_p2</rtlName>
<control/>
<opType>icmp</opType>
<implIndex/>
<coreName/>
<coreId>833</coreId>
</Obj>
<bitwidth>1</bitwidth>
</Value>
<oprand_edges>
<count>2</count>
<item_version>0</item_version>
<item>204</item>
<item>205</item>
</oprand_edges>
<opcode>icmp</opcode>
<m_Display>0</m_Display>
<m_isOnCriticalPath>0</m_isOnCriticalPath>
<m_isLCDNode>0</m_isLCDNode>
<m_isStartOfPath>0</m_isStartOfPath>
<m_delay>1.31</m_delay>
<m_topoIndex>35</m_topoIndex>
<m_clusterGroupNumber>-1</m_clusterGroupNumber>
</item>
<item class_id_reference="9" object_id="_58">
<Value>
<Obj>
<type>0</type>
<id>66</id>
<name>xor_ln56_1</name>
<fileName>/home/willychiang/Desktop/PYNQ-HelloWorld/boards/ip/vitis_lib/vision/L1/include/imgproc/xf_inrange.hpp</fileName>
<fileDirectory>..</fileDirectory>
<lineNumber>56</lineNumber>
<contextFuncName>inrangeproc&lt;9, 1, 15, 0, 9, 1&gt;</contextFuncName>
<contextNormFuncName>inrangeproc_9_1_15_0_9_1_s</contextNormFuncName>
<inlineStackInfo>
<count>1</count>
<item_version>0</item_version>
<item>
<first>/home/willychiang/Desktop/PYNQ-HelloWorld/boards/ip</first>
<second>
<count>1</count>
<item_version>0</item_version>
<item>
<first>
<first>/home/willychiang/Desktop/PYNQ-HelloWorld/boards/ip/vitis_lib/vision/L1/include/imgproc/xf_inrange.hpp</first>
<second>inrangeproc&lt;9, 1, 15, 0, 9, 1&gt;</second>
</first>
<second>56</second>
</item>
</second>
</item>
</inlineStackInfo>
<originalName/>
<rtlName>xor_ln56_1_fu_299_p2</rtlName>
<control/>
<opType>xor</opType>
<implIndex/>
<coreName/>
<coreId>913</coreId>
</Obj>
<bitwidth>1</bitwidth>
</Value>
<oprand_edges>
<count>2</count>
<item_version>0</item_version>
<item>206</item>
<item>207</item>
</oprand_edges>
<opcode>xor</opcode>
<m_Display>0</m_Display>
<m_isOnCriticalPath>0</m_isOnCriticalPath>
<m_isLCDNode>0</m_isLCDNode>
<m_isStartOfPath>0</m_isStartOfPath>
<m_delay>0.00</m_delay>
<m_topoIndex>36</m_topoIndex>
<m_clusterGroupNumber>1</m_clusterGroupNumber>
</item>
<item class_id_reference="9" object_id="_59">
<Value>
<Obj>
<type>0</type>
<id>67</id>
<name>icmp_ln890</name>
<fileName>/tools/Xilinx/Vitis_HLS/2020.2/common/technology/autopilot/ap_int_base.h</fileName>
<fileDirectory>..</fileDirectory>
<lineNumber>890</lineNumber>
<contextFuncName>operator&lt;=&lt;8, false&gt;</contextFuncName>
<contextNormFuncName>operator_le_8_false</contextNormFuncName>
<inlineStackInfo>
<count>1</count>
<item_version>0</item_version>
<item>
<first>/home/willychiang/Desktop/PYNQ-HelloWorld/boards/ip</first>
<second>
<count>1</count>
<item_version>0</item_version>
<item>
<first>
<first>/tools/Xilinx/Vitis_HLS/2020.2/common/technology/autopilot/ap_int_base.h</first>
<second>operator&lt;=&lt;8, false&gt;</second>
</first>
<second>890</second>
</item>
</second>
</item>
</inlineStackInfo>
<originalName/>
<rtlName>icmp_ln890_fu_305_p2</rtlName>
<control/>
<opType>icmp</opType>
<implIndex/>
<coreName/>
<coreId>49</coreId>
</Obj>
<bitwidth>1</bitwidth>
</Value>
<oprand_edges>
<count>2</count>
<item_version>0</item_version>
<item>208</item>
<item>209</item>
</oprand_edges>
<opcode>icmp</opcode>
<m_Display>0</m_Display>
<m_isOnCriticalPath>0</m_isOnCriticalPath>
<m_isLCDNode>0</m_isLCDNode>
<m_isStartOfPath>0</m_isStartOfPath>
<m_delay>1.31</m_delay>
<m_topoIndex>37</m_topoIndex>
<m_clusterGroupNumber>-1</m_clusterGroupNumber>
</item>
<item class_id_reference="9" object_id="_60">
<Value>
<Obj>
<type>0</type>
<id>68</id>
<name>xor_ln890</name>
<fileName>/tools/Xilinx/Vitis_HLS/2020.2/common/technology/autopilot/ap_int_base.h</fileName>
<fileDirectory>..</fileDirectory>
<lineNumber>890</lineNumber>
<contextFuncName>operator&lt;=&lt;8, false&gt;</contextFuncName>
<contextNormFuncName>operator_le_8_false</contextNormFuncName>
<inlineStackInfo>
<count>1</count>
<item_version>0</item_version>
<item>
<first>/home/willychiang/Desktop/PYNQ-HelloWorld/boards/ip</first>
<second>
<count>1</count>
<item_version>0</item_version>
<item>
<first>
<first>/tools/Xilinx/Vitis_HLS/2020.2/common/technology/autopilot/ap_int_base.h</first>
<second>operator&lt;=&lt;8, false&gt;</second>
</first>
<second>890</second>
</item>
</second>
</item>
</inlineStackInfo>
<originalName/>
<rtlName>xor_ln890_fu_310_p2</rtlName>
<control/>
<opType>xor</opType>
<implIndex/>
<coreName/>
<coreId>132</coreId>
</Obj>
<bitwidth>1</bitwidth>
</Value>
<oprand_edges>
<count>2</count>
<item_version>0</item_version>
<item>210</item>
<item>211</item>
</oprand_edges>
<opcode>xor</opcode>
<m_Display>0</m_Display>
<m_isOnCriticalPath>0</m_isOnCriticalPath>
<m_isLCDNode>0</m_isLCDNode>
<m_isStartOfPath>0</m_isStartOfPath>
<m_delay>0.00</m_delay>
<m_topoIndex>38</m_topoIndex>
<m_clusterGroupNumber>1</m_clusterGroupNumber>
</item>
<item class_id_reference="9" object_id="_61">
<Value>
<Obj>
<type>0</type>
<id>69</id>
<name>icmp_ln56_2</name>
<fileName>/home/willychiang/Desktop/PYNQ-HelloWorld/boards/ip/vitis_lib/vision/L1/include/imgproc/xf_inrange.hpp</fileName>
<fileDirectory>..</fileDirectory>
<lineNumber>56</lineNumber>
<contextFuncName>inrangeproc&lt;9, 1, 15, 0, 9, 1&gt;</contextFuncName>
<contextNormFuncName>inrangeproc_9_1_15_0_9_1_s</contextNormFuncName>
<inlineStackInfo>
<count>1</count>
<item_version>0</item_version>
<item>
<first>/home/willychiang/Desktop/PYNQ-HelloWorld/boards/ip</first>
<second>
<count>1</count>
<item_version>0</item_version>
<item>
<first>
<first>/home/willychiang/Desktop/PYNQ-HelloWorld/boards/ip/vitis_lib/vision/L1/include/imgproc/xf_inrange.hpp</first>
<second>inrangeproc&lt;9, 1, 15, 0, 9, 1&gt;</second>
</first>
<second>56</second>
</item>
</second>
</item>
</inlineStackInfo>
<originalName/>
<rtlName>icmp_ln56_2_fu_316_p2</rtlName>
<control/>
<opType>icmp</opType>
<implIndex/>
<coreName/>
<coreId>49</coreId>
</Obj>
<bitwidth>1</bitwidth>
</Value>
<oprand_edges>
<count>2</count>
<item_version>0</item_version>
<item>212</item>
<item>213</item>
</oprand_edges>
<opcode>icmp</opcode>
<m_Display>0</m_Display>
<m_isOnCriticalPath>0</m_isOnCriticalPath>
<m_isLCDNode>0</m_isLCDNode>
<m_isStartOfPath>0</m_isStartOfPath>
<m_delay>1.31</m_delay>
<m_topoIndex>39</m_topoIndex>
<m_clusterGroupNumber>-1</m_clusterGroupNumber>
</item>
<item class_id_reference="9" object_id="_62">
<Value>
<Obj>
<type>0</type>
<id>70</id>
<name>xor_ln56_2</name>
<fileName>/home/willychiang/Desktop/PYNQ-HelloWorld/boards/ip/vitis_lib/vision/L1/include/imgproc/xf_inrange.hpp</fileName>
<fileDirectory>..</fileDirectory>
<lineNumber>56</lineNumber>
<contextFuncName>inrangeproc&lt;9, 1, 15, 0, 9, 1&gt;</contextFuncName>
<contextNormFuncName>inrangeproc_9_1_15_0_9_1_s</contextNormFuncName>
<inlineStackInfo>
<count>1</count>
<item_version>0</item_version>
<item>
<first>/home/willychiang/Desktop/PYNQ-HelloWorld/boards/ip</first>
<second>
<count>1</count>
<item_version>0</item_version>
<item>
<first>
<first>/home/willychiang/Desktop/PYNQ-HelloWorld/boards/ip/vitis_lib/vision/L1/include/imgproc/xf_inrange.hpp</first>
<second>inrangeproc&lt;9, 1, 15, 0, 9, 1&gt;</second>
</first>
<second>56</second>
</item>
</second>
</item>
</inlineStackInfo>
<originalName/>
<rtlName>xor_ln56_2_fu_321_p2</rtlName>
<control/>
<opType>xor</opType>
<implIndex/>
<coreName/>
<coreId>132</coreId>
</Obj>
<bitwidth>1</bitwidth>
</Value>
<oprand_edges>
<count>2</count>
<item_version>0</item_version>
<item>214</item>
<item>215</item>
</oprand_edges>
<opcode>xor</opcode>
<m_Display>0</m_Display>
<m_isOnCriticalPath>0</m_isOnCriticalPath>
<m_isLCDNode>0</m_isLCDNode>
<m_isStartOfPath>0</m_isStartOfPath>
<m_delay>0.00</m_delay>
<m_topoIndex>40</m_topoIndex>
<m_clusterGroupNumber>1</m_clusterGroupNumber>
</item>
<item class_id_reference="9" object_id="_63">
<Value>
<Obj>
<type>0</type>
<id>71</id>
<name>icmp_ln890_1</name>
<fileName>/tools/Xilinx/Vitis_HLS/2020.2/common/technology/autopilot/ap_int_base.h</fileName>
<fileDirectory>..</fileDirectory>
<lineNumber>890</lineNumber>
<contextFuncName>operator&lt;=&lt;8, false&gt;</contextFuncName>
<contextNormFuncName>operator_le_8_false</contextNormFuncName>
<inlineStackInfo>
<count>1</count>
<item_version>0</item_version>
<item>
<first>/home/willychiang/Desktop/PYNQ-HelloWorld/boards/ip</first>
<second>
<count>1</count>
<item_version>0</item_version>
<item>
<first>
<first>/tools/Xilinx/Vitis_HLS/2020.2/common/technology/autopilot/ap_int_base.h</first>
<second>operator&lt;=&lt;8, false&gt;</second>
</first>
<second>890</second>
</item>
</second>
</item>
</inlineStackInfo>
<originalName/>
<rtlName>icmp_ln890_1_fu_327_p2</rtlName>
<control/>
<opType>icmp</opType>
<implIndex/>
<coreName/>
<coreId>49</coreId>
</Obj>
<bitwidth>1</bitwidth>
</Value>
<oprand_edges>
<count>2</count>
<item_version>0</item_version>
<item>216</item>
<item>217</item>
</oprand_edges>
<opcode>icmp</opcode>
<m_Display>0</m_Display>
<m_isOnCriticalPath>0</m_isOnCriticalPath>
<m_isLCDNode>0</m_isLCDNode>
<m_isStartOfPath>0</m_isStartOfPath>
<m_delay>1.31</m_delay>
<m_topoIndex>41</m_topoIndex>
<m_clusterGroupNumber>-1</m_clusterGroupNumber>
</item>
<item class_id_reference="9" object_id="_64">
<Value>
<Obj>
<type>0</type>
<id>72</id>
<name>xor_ln890_1</name>
<fileName>/tools/Xilinx/Vitis_HLS/2020.2/common/technology/autopilot/ap_int_base.h</fileName>
<fileDirectory>..</fileDirectory>
<lineNumber>890</lineNumber>
<contextFuncName>operator&lt;=&lt;8, false&gt;</contextFuncName>
<contextNormFuncName>operator_le_8_false</contextNormFuncName>
<inlineStackInfo>
<count>1</count>
<item_version>0</item_version>
<item>
<first>/home/willychiang/Desktop/PYNQ-HelloWorld/boards/ip</first>
<second>
<count>1</count>
<item_version>0</item_version>
<item>
<first>
<first>/tools/Xilinx/Vitis_HLS/2020.2/common/technology/autopilot/ap_int_base.h</first>
<second>operator&lt;=&lt;8, false&gt;</second>
</first>
<second>890</second>
</item>
</second>
</item>
</inlineStackInfo>
<originalName/>
<rtlName>xor_ln890_1_fu_332_p2</rtlName>
<control/>
<opType>xor</opType>
<implIndex/>
<coreName/>
<coreId>913</coreId>
</Obj>
<bitwidth>1</bitwidth>
</Value>
<oprand_edges>
<count>2</count>
<item_version>0</item_version>
<item>218</item>
<item>219</item>
</oprand_edges>
<opcode>xor</opcode>
<m_Display>0</m_Display>
<m_isOnCriticalPath>0</m_isOnCriticalPath>
<m_isLCDNode>0</m_isLCDNode>
<m_isStartOfPath>0</m_isStartOfPath>
<m_delay>0.00</m_delay>
<m_topoIndex>42</m_topoIndex>
<m_clusterGroupNumber>1</m_clusterGroupNumber>
</item>
<item class_id_reference="9" object_id="_65">
<Value>
<Obj>
<type>0</type>
<id>73</id>
<name>icmp_ln56_3</name>
<fileName>/home/willychiang/Desktop/PYNQ-HelloWorld/boards/ip/vitis_lib/vision/L1/include/imgproc/xf_inrange.hpp</fileName>
<fileDirectory>..</fileDirectory>
<lineNumber>56</lineNumber>
<contextFuncName>inrangeproc&lt;9, 1, 15, 0, 9, 1&gt;</contextFuncName>
<contextNormFuncName>inrangeproc_9_1_15_0_9_1_s</contextNormFuncName>
<inlineStackInfo>
<count>1</count>
<item_version>0</item_version>
<item>
<first>/home/willychiang/Desktop/PYNQ-HelloWorld/boards/ip</first>
<second>
<count>1</count>
<item_version>0</item_version>
<item>
<first>
<first>/home/willychiang/Desktop/PYNQ-HelloWorld/boards/ip/vitis_lib/vision/L1/include/imgproc/xf_inrange.hpp</first>
<second>inrangeproc&lt;9, 1, 15, 0, 9, 1&gt;</second>
</first>
<second>56</second>
</item>
</second>
</item>
</inlineStackInfo>
<originalName/>
<rtlName>icmp_ln56_3_fu_338_p2</rtlName>
<control/>
<opType>icmp</opType>
<implIndex/>
<coreName/>
<coreId>875707508</coreId>
</Obj>
<bitwidth>1</bitwidth>
</Value>
<oprand_edges>
<count>2</count>
<item_version>0</item_version>
<item>220</item>
<item>221</item>
</oprand_edges>
<opcode>icmp</opcode>
<m_Display>0</m_Display>
<m_isOnCriticalPath>0</m_isOnCriticalPath>
<m_isLCDNode>0</m_isLCDNode>
<m_isStartOfPath>0</m_isStartOfPath>
<m_delay>1.31</m_delay>
<m_topoIndex>43</m_topoIndex>
<m_clusterGroupNumber>-1</m_clusterGroupNumber>
</item>
<item class_id_reference="9" object_id="_66">
<Value>
<Obj>
<type>0</type>
<id>74</id>
<name>xor_ln56_3</name>
<fileName>/home/willychiang/Desktop/PYNQ-HelloWorld/boards/ip/vitis_lib/vision/L1/include/imgproc/xf_inrange.hpp</fileName>
<fileDirectory>..</fileDirectory>
<lineNumber>56</lineNumber>
<contextFuncName>inrangeproc&lt;9, 1, 15, 0, 9, 1&gt;</contextFuncName>
<contextNormFuncName>inrangeproc_9_1_15_0_9_1_s</contextNormFuncName>
<inlineStackInfo>
<count>1</count>
<item_version>0</item_version>
<item>
<first>/home/willychiang/Desktop/PYNQ-HelloWorld/boards/ip</first>
<second>
<count>1</count>
<item_version>0</item_version>
<item>
<first>
<first>/home/willychiang/Desktop/PYNQ-HelloWorld/boards/ip/vitis_lib/vision/L1/include/imgproc/xf_inrange.hpp</first>
<second>inrangeproc&lt;9, 1, 15, 0, 9, 1&gt;</second>
</first>
<second>56</second>
</item>
</second>
</item>
</inlineStackInfo>
<originalName/>
<rtlName>xor_ln56_3_fu_343_p2</rtlName>
<control/>
<opType>xor</opType>
<implIndex/>
<coreName/>
<coreId>132</coreId>
</Obj>
<bitwidth>1</bitwidth>
</Value>
<oprand_edges>
<count>2</count>
<item_version>0</item_version>
<item>222</item>
<item>223</item>
</oprand_edges>
<opcode>xor</opcode>
<m_Display>0</m_Display>
<m_isOnCriticalPath>0</m_isOnCriticalPath>
<m_isLCDNode>0</m_isLCDNode>
<m_isStartOfPath>0</m_isStartOfPath>
<m_delay>0.00</m_delay>
<m_topoIndex>44</m_topoIndex>
<m_clusterGroupNumber>1</m_clusterGroupNumber>
</item>
<item class_id_reference="9" object_id="_67">
<Value>
<Obj>
<type>0</type>
<id>75</id>
<name>and_ln1348</name>
<fileName>/tools/Xilinx/Vitis_HLS/2020.2/common/technology/autopilot/ap_int_base.h</fileName>
<fileDirectory>..</fileDirectory>
<lineNumber>1348</lineNumber>
<contextFuncName>operator&amp;&lt;8, false, 8, false&gt;</contextFuncName>
<contextNormFuncName>operator_8_false_8_false_s</contextNormFuncName>
<inlineStackInfo>
<count>1</count>
<item_version>0</item_version>
<item>
<first>/home/willychiang/Desktop/PYNQ-HelloWorld/boards/ip</first>
<second>
<count>1</count>
<item_version>0</item_version>
<item>
<first>
<first>/tools/Xilinx/Vitis_HLS/2020.2/common/technology/autopilot/ap_int_base.h</first>
<second>operator&amp;&lt;8, false, 8, false&gt;</second>
</first>
<second>1348</second>
</item>
</second>
</item>
</inlineStackInfo>
<originalName/>
<rtlName>and_ln1348_fu_349_p2</rtlName>
<control/>
<opType>and</opType>
<implIndex/>
<coreName/>
<coreId>961</coreId>
</Obj>
<bitwidth>1</bitwidth>
</Value>
<oprand_edges>
<count>2</count>
<item_version>0</item_version>
<item>224</item>
<item>225</item>
</oprand_edges>
<opcode>and</opcode>
<m_Display>0</m_Display>
<m_isOnCriticalPath>0</m_isOnCriticalPath>
<m_isLCDNode>0</m_isLCDNode>
<m_isStartOfPath>0</m_isStartOfPath>
<m_delay>0.00</m_delay>
<m_topoIndex>45</m_topoIndex>
<m_clusterGroupNumber>1</m_clusterGroupNumber>
</item>
<item class_id_reference="9" object_id="_68">
<Value>
<Obj>
<type>0</type>
<id>76</id>
<name>and_ln1348_2</name>
<fileName>/tools/Xilinx/Vitis_HLS/2020.2/common/technology/autopilot/ap_int_base.h</fileName>
<fileDirectory>..</fileDirectory>
<lineNumber>1348</lineNumber>
<contextFuncName>operator&amp;&lt;8, false, 8, false&gt;</contextFuncName>
<contextNormFuncName>operator_8_false_8_false_s</contextNormFuncName>
<inlineStackInfo>
<count>1</count>
<item_version>0</item_version>
<item>
<first>/home/willychiang/Desktop/PYNQ-HelloWorld/boards/ip</first>
<second>
<count>1</count>
<item_version>0</item_version>
<item>
<first>
<first>/tools/Xilinx/Vitis_HLS/2020.2/common/technology/autopilot/ap_int_base.h</first>
<second>operator&amp;&lt;8, false, 8, false&gt;</second>
</first>
<second>1348</second>
</item>
</second>
</item>
</inlineStackInfo>
<originalName/>
<rtlName>and_ln1348_2_fu_355_p2</rtlName>
<control/>
<opType>and</opType>
<implIndex/>
<coreName/>
<coreId>49</coreId>
</Obj>
<bitwidth>1</bitwidth>
</Value>
<oprand_edges>
<count>2</count>
<item_version>0</item_version>
<item>226</item>
<item>227</item>
</oprand_edges>
<opcode>and</opcode>
<m_Display>0</m_Display>
<m_isOnCriticalPath>0</m_isOnCriticalPath>
<m_isLCDNode>0</m_isLCDNode>
<m_isStartOfPath>0</m_isStartOfPath>
<m_delay>0.00</m_delay>
<m_topoIndex>46</m_topoIndex>
<m_clusterGroupNumber>1</m_clusterGroupNumber>
</item>
<item class_id_reference="9" object_id="_69">
<Value>
<Obj>
<type>0</type>
<id>77</id>
<name>and_ln1348_4</name>
<fileName>/tools/Xilinx/Vitis_HLS/2020.2/common/technology/autopilot/ap_int_base.h</fileName>
<fileDirectory>..</fileDirectory>
<lineNumber>1348</lineNumber>
<contextFuncName>operator&amp;&lt;8, false, 8, false&gt;</contextFuncName>
<contextNormFuncName>operator_8_false_8_false_s</contextNormFuncName>
<inlineStackInfo>
<count>1</count>
<item_version>0</item_version>
<item>
<first>/home/willychiang/Desktop/PYNQ-HelloWorld/boards/ip</first>
<second>
<count>1</count>
<item_version>0</item_version>
<item>
<first>
<first>/tools/Xilinx/Vitis_HLS/2020.2/common/technology/autopilot/ap_int_base.h</first>
<second>operator&amp;&lt;8, false, 8, false&gt;</second>
</first>
<second>1348</second>
</item>
</second>
</item>
</inlineStackInfo>
<originalName/>
<rtlName>and_ln1348_4_fu_361_p2</rtlName>
<control/>
<opType>and</opType>
<implIndex/>
<coreName/>
<coreId>993</coreId>
</Obj>
<bitwidth>1</bitwidth>
</Value>
<oprand_edges>
<count>2</count>
<item_version>0</item_version>
<item>228</item>
<item>229</item>
</oprand_edges>
<opcode>and</opcode>
<m_Display>0</m_Display>
<m_isOnCriticalPath>0</m_isOnCriticalPath>
<m_isLCDNode>0</m_isLCDNode>
<m_isStartOfPath>0</m_isStartOfPath>
<m_delay>0.00</m_delay>
<m_topoIndex>47</m_topoIndex>
<m_clusterGroupNumber>1</m_clusterGroupNumber>
</item>
<item class_id_reference="9" object_id="_70">
<Value>
<Obj>
<type>0</type>
<id>78</id>
<name>and_ln1348_6</name>
<fileName>/tools/Xilinx/Vitis_HLS/2020.2/common/technology/autopilot/ap_int_base.h</fileName>
<fileDirectory>..</fileDirectory>
<lineNumber>1348</lineNumber>
<contextFuncName>operator&amp;&lt;8, false, 8, false&gt;</contextFuncName>
<contextNormFuncName>operator_8_false_8_false_s</contextNormFuncName>
<inlineStackInfo>
<count>1</count>
<item_version>0</item_version>
<item>
<first>/home/willychiang/Desktop/PYNQ-HelloWorld/boards/ip</first>
<second>
<count>1</count>
<item_version>0</item_version>
<item>
<first>
<first>/tools/Xilinx/Vitis_HLS/2020.2/common/technology/autopilot/ap_int_base.h</first>
<second>operator&amp;&lt;8, false, 8, false&gt;</second>
</first>
<second>1348</second>
</item>
</second>
</item>
</inlineStackInfo>
<originalName/>
<rtlName>and_ln1348_6_fu_367_p2</rtlName>
<control/>
<opType>and</opType>
<implIndex/>
<coreName/>
<coreId>0</coreId>
</Obj>
<bitwidth>1</bitwidth>
</Value>
<oprand_edges>
<count>2</count>
<item_version>0</item_version>
<item>230</item>
<item>231</item>
</oprand_edges>
<opcode>and</opcode>
<m_Display>0</m_Display>
<m_isOnCriticalPath>0</m_isOnCriticalPath>
<m_isLCDNode>0</m_isLCDNode>
<m_isStartOfPath>0</m_isStartOfPath>
<m_delay>0.00</m_delay>
<m_topoIndex>48</m_topoIndex>
<m_clusterGroupNumber>1</m_clusterGroupNumber>
</item>
<item class_id_reference="9" object_id="_71">
<Value>
<Obj>
<type>0</type>
<id>79</id>
<name>and_ln1348_1</name>
<fileName>/tools/Xilinx/Vitis_HLS/2020.2/common/technology/autopilot/ap_int_base.h</fileName>
<fileDirectory>..</fileDirectory>
<lineNumber>1348</lineNumber>
<contextFuncName>operator&amp;&lt;8, false, 8, false&gt;</contextFuncName>
<contextNormFuncName>operator_8_false_8_false_s</contextNormFuncName>
<inlineStackInfo>
<count>1</count>
<item_version>0</item_version>
<item>
<first>/home/willychiang/Desktop/PYNQ-HelloWorld/boards/ip</first>
<second>
<count>1</count>
<item_version>0</item_version>
<item>
<first>
<first>/tools/Xilinx/Vitis_HLS/2020.2/common/technology/autopilot/ap_int_base.h</first>
<second>operator&amp;&lt;8, false, 8, false&gt;</second>
</first>
<second>1348</second>
</item>
</second>
</item>
</inlineStackInfo>
<originalName/>
<rtlName>and_ln1348_1_fu_373_p2</rtlName>
<control/>
<opType>and</opType>
<implIndex/>
<coreName/>
<coreId>49</coreId>
</Obj>
<bitwidth>1</bitwidth>
</Value>
<oprand_edges>
<count>2</count>
<item_version>0</item_version>
<item>232</item>
<item>233</item>
</oprand_edges>
<opcode>and</opcode>
<m_Display>0</m_Display>
<m_isOnCriticalPath>0</m_isOnCriticalPath>
<m_isLCDNode>0</m_isLCDNode>
<m_isStartOfPath>0</m_isStartOfPath>
<m_delay>0.80</m_delay>
<m_topoIndex>49</m_topoIndex>
<m_clusterGroupNumber>1</m_clusterGroupNumber>
</item>
<item class_id_reference="9" object_id="_72">
<Value>
<Obj>
<type>0</type>
<id>80</id>
<name>icmp_ln56_4</name>
<fileName>/home/willychiang/Desktop/PYNQ-HelloWorld/boards/ip/vitis_lib/vision/L1/include/imgproc/xf_inrange.hpp</fileName>
<fileDirectory>..</fileDirectory>
<lineNumber>56</lineNumber>
<contextFuncName>inrangeproc&lt;9, 1, 15, 0, 9, 1&gt;</contextFuncName>
<contextNormFuncName>inrangeproc_9_1_15_0_9_1_s</contextNormFuncName>
<inlineStackInfo>
<count>1</count>
<item_version>0</item_version>
<item>
<first>/home/willychiang/Desktop/PYNQ-HelloWorld/boards/ip</first>
<second>
<count>1</count>
<item_version>0</item_version>
<item>
<first>
<first>/home/willychiang/Desktop/PYNQ-HelloWorld/boards/ip/vitis_lib/vision/L1/include/imgproc/xf_inrange.hpp</first>
<second>inrangeproc&lt;9, 1, 15, 0, 9, 1&gt;</second>
</first>
<second>56</second>
</item>
</second>
</item>
</inlineStackInfo>
<originalName/>
<rtlName>icmp_ln56_4_fu_379_p2</rtlName>
<control/>
<opType>icmp</opType>
<implIndex/>
<coreName/>
<coreId>1041</coreId>
</Obj>
<bitwidth>1</bitwidth>
</Value>
<oprand_edges>
<count>2</count>
<item_version>0</item_version>
<item>234</item>
<item>235</item>
</oprand_edges>
<opcode>icmp</opcode>
<m_Display>0</m_Display>
<m_isOnCriticalPath>0</m_isOnCriticalPath>
<m_isLCDNode>0</m_isLCDNode>
<m_isStartOfPath>0</m_isStartOfPath>
<m_delay>1.31</m_delay>
<m_topoIndex>50</m_topoIndex>
<m_clusterGroupNumber>-1</m_clusterGroupNumber>
</item>
<item class_id_reference="9" object_id="_73">
<Value>
<Obj>
<type>0</type>
<id>81</id>
<name>xor_ln56_4</name>
<fileName>/home/willychiang/Desktop/PYNQ-HelloWorld/boards/ip/vitis_lib/vision/L1/include/imgproc/xf_inrange.hpp</fileName>
<fileDirectory>..</fileDirectory>
<lineNumber>56</lineNumber>
<contextFuncName>inrangeproc&lt;9, 1, 15, 0, 9, 1&gt;</contextFuncName>
<contextNormFuncName>inrangeproc_9_1_15_0_9_1_s</contextNormFuncName>
<inlineStackInfo>
<count>1</count>
<item_version>0</item_version>
<item>
<first>/home/willychiang/Desktop/PYNQ-HelloWorld/boards/ip</first>
<second>
<count>1</count>
<item_version>0</item_version>
<item>
<first>
<first>/home/willychiang/Desktop/PYNQ-HelloWorld/boards/ip/vitis_lib/vision/L1/include/imgproc/xf_inrange.hpp</first>
<second>inrangeproc&lt;9, 1, 15, 0, 9, 1&gt;</second>
</first>
<second>56</second>
</item>
</second>
</item>
</inlineStackInfo>
<originalName/>
<rtlName>xor_ln56_4_fu_384_p2</rtlName>
<control/>
<opType>xor</opType>
<implIndex/>
<coreName/>
<coreId>0</coreId>
</Obj>
<bitwidth>1</bitwidth>
</Value>
<oprand_edges>
<count>2</count>
<item_version>0</item_version>
<item>236</item>
<item>237</item>
</oprand_edges>
<opcode>xor</opcode>
<m_Display>0</m_Display>
<m_isOnCriticalPath>0</m_isOnCriticalPath>
<m_isLCDNode>0</m_isLCDNode>
<m_isStartOfPath>0</m_isStartOfPath>
<m_delay>0.00</m_delay>
<m_topoIndex>51</m_topoIndex>
<m_clusterGroupNumber>2</m_clusterGroupNumber>
</item>
<item class_id_reference="9" object_id="_74">
<Value>
<Obj>
<type>0</type>
<id>82</id>
<name>icmp_ln56_5</name>
<fileName>/home/willychiang/Desktop/PYNQ-HelloWorld/boards/ip/vitis_lib/vision/L1/include/imgproc/xf_inrange.hpp</fileName>
<fileDirectory>..</fileDirectory>
<lineNumber>56</lineNumber>
<contextFuncName>inrangeproc&lt;9, 1, 15, 0, 9, 1&gt;</contextFuncName>
<contextNormFuncName>inrangeproc_9_1_15_0_9_1_s</contextNormFuncName>
<inlineStackInfo>
<count>1</count>
<item_version>0</item_version>
<item>
<first>/home/willychiang/Desktop/PYNQ-HelloWorld/boards/ip</first>
<second>
<count>1</count>
<item_version>0</item_version>
<item>
<first>
<first>/home/willychiang/Desktop/PYNQ-HelloWorld/boards/ip/vitis_lib/vision/L1/include/imgproc/xf_inrange.hpp</first>
<second>inrangeproc&lt;9, 1, 15, 0, 9, 1&gt;</second>
</first>
<second>56</second>
</item>
</second>
</item>
</inlineStackInfo>
<originalName/>
<rtlName>icmp_ln56_5_fu_390_p2</rtlName>
<control/>
<opType>icmp</opType>
<implIndex/>
<coreName/>
<coreId>132</coreId>
</Obj>
<bitwidth>1</bitwidth>
</Value>
<oprand_edges>
<count>2</count>
<item_version>0</item_version>
<item>238</item>
<item>239</item>
</oprand_edges>
<opcode>icmp</opcode>
<m_Display>0</m_Display>
<m_isOnCriticalPath>0</m_isOnCriticalPath>
<m_isLCDNode>0</m_isLCDNode>
<m_isStartOfPath>0</m_isStartOfPath>
<m_delay>1.31</m_delay>
<m_topoIndex>52</m_topoIndex>
<m_clusterGroupNumber>-1</m_clusterGroupNumber>
</item>
<item class_id_reference="9" object_id="_75">
<Value>
<Obj>
<type>0</type>
<id>83</id>
<name>xor_ln56_5</name>
<fileName>/home/willychiang/Desktop/PYNQ-HelloWorld/boards/ip/vitis_lib/vision/L1/include/imgproc/xf_inrange.hpp</fileName>
<fileDirectory>..</fileDirectory>
<lineNumber>56</lineNumber>
<contextFuncName>inrangeproc&lt;9, 1, 15, 0, 9, 1&gt;</contextFuncName>
<contextNormFuncName>inrangeproc_9_1_15_0_9_1_s</contextNormFuncName>
<inlineStackInfo>
<count>1</count>
<item_version>0</item_version>
<item>
<first>/home/willychiang/Desktop/PYNQ-HelloWorld/boards/ip</first>
<second>
<count>1</count>
<item_version>0</item_version>
<item>
<first>
<first>/home/willychiang/Desktop/PYNQ-HelloWorld/boards/ip/vitis_lib/vision/L1/include/imgproc/xf_inrange.hpp</first>
<second>inrangeproc&lt;9, 1, 15, 0, 9, 1&gt;</second>
</first>
<second>56</second>
</item>
</second>
</item>
</inlineStackInfo>
<originalName/>
<rtlName>xor_ln56_5_fu_395_p2</rtlName>
<control/>
<opType>xor</opType>
<implIndex/>
<coreName/>
<coreId>1089</coreId>
</Obj>
<bitwidth>1</bitwidth>
</Value>
<oprand_edges>
<count>2</count>
<item_version>0</item_version>
<item>240</item>
<item>241</item>
</oprand_edges>
<opcode>xor</opcode>
<m_Display>0</m_Display>
<m_isOnCriticalPath>0</m_isOnCriticalPath>
<m_isLCDNode>0</m_isLCDNode>
<m_isStartOfPath>0</m_isStartOfPath>
<m_delay>0.00</m_delay>
<m_topoIndex>53</m_topoIndex>
<m_clusterGroupNumber>2</m_clusterGroupNumber>
</item>
<item class_id_reference="9" object_id="_76">
<Value>
<Obj>
<type>0</type>
<id>84</id>
<name>icmp_ln890_2</name>
<fileName>/tools/Xilinx/Vitis_HLS/2020.2/common/technology/autopilot/ap_int_base.h</fileName>
<fileDirectory>..</fileDirectory>
<lineNumber>890</lineNumber>
<contextFuncName>operator&lt;=&lt;8, false&gt;</contextFuncName>
<contextNormFuncName>operator_le_8_false</contextNormFuncName>
<inlineStackInfo>
<count>1</count>
<item_version>0</item_version>
<item>
<first>/home/willychiang/Desktop/PYNQ-HelloWorld/boards/ip</first>
<second>
<count>1</count>
<item_version>0</item_version>
<item>
<first>
<first>/tools/Xilinx/Vitis_HLS/2020.2/common/technology/autopilot/ap_int_base.h</first>
<second>operator&lt;=&lt;8, false&gt;</second>
</first>
<second>890</second>
</item>
</second>
</item>
</inlineStackInfo>
<originalName/>
<rtlName>icmp_ln890_2_fu_401_p2</rtlName>
<control/>
<opType>icmp</opType>
<implIndex/>
<coreName/>
<coreId>49</coreId>
</Obj>
<bitwidth>1</bitwidth>
</Value>
<oprand_edges>
<count>2</count>
<item_version>0</item_version>
<item>242</item>
<item>243</item>
</oprand_edges>
<opcode>icmp</opcode>
<m_Display>0</m_Display>
<m_isOnCriticalPath>0</m_isOnCriticalPath>
<m_isLCDNode>0</m_isLCDNode>
<m_isStartOfPath>0</m_isStartOfPath>
<m_delay>1.31</m_delay>
<m_topoIndex>54</m_topoIndex>
<m_clusterGroupNumber>-1</m_clusterGroupNumber>
</item>
<item class_id_reference="9" object_id="_77">
<Value>
<Obj>
<type>0</type>
<id>85</id>
<name>xor_ln890_2</name>
<fileName>/tools/Xilinx/Vitis_HLS/2020.2/common/technology/autopilot/ap_int_base.h</fileName>
<fileDirectory>..</fileDirectory>
<lineNumber>890</lineNumber>
<contextFuncName>operator&lt;=&lt;8, false&gt;</contextFuncName>
<contextNormFuncName>operator_le_8_false</contextNormFuncName>
<inlineStackInfo>
<count>1</count>
<item_version>0</item_version>
<item>
<first>/home/willychiang/Desktop/PYNQ-HelloWorld/boards/ip</first>
<second>
<count>1</count>
<item_version>0</item_version>
<item>
<first>
<first>/tools/Xilinx/Vitis_HLS/2020.2/common/technology/autopilot/ap_int_base.h</first>
<second>operator&lt;=&lt;8, false&gt;</second>
</first>
<second>890</second>
</item>
</second>
</item>
</inlineStackInfo>
<originalName/>
<rtlName>xor_ln890_2_fu_406_p2</rtlName>
<control/>
<opType>xor</opType>
<implIndex/>
<coreName/>
<coreId>49</coreId>
</Obj>
<bitwidth>1</bitwidth>
</Value>
<oprand_edges>
<count>2</count>
<item_version>0</item_version>
<item>244</item>
<item>245</item>
</oprand_edges>
<opcode>xor</opcode>
<m_Display>0</m_Display>
<m_isOnCriticalPath>0</m_isOnCriticalPath>
<m_isLCDNode>0</m_isLCDNode>
<m_isStartOfPath>0</m_isStartOfPath>
<m_delay>0.00</m_delay>
<m_topoIndex>55</m_topoIndex>
<m_clusterGroupNumber>2</m_clusterGroupNumber>
</item>
<item class_id_reference="9" object_id="_78">
<Value>
<Obj>
<type>0</type>
<id>86</id>
<name>icmp_ln56_6</name>
<fileName>/home/willychiang/Desktop/PYNQ-HelloWorld/boards/ip/vitis_lib/vision/L1/include/imgproc/xf_inrange.hpp</fileName>
<fileDirectory>..</fileDirectory>
<lineNumber>56</lineNumber>
<contextFuncName>inrangeproc&lt;9, 1, 15, 0, 9, 1&gt;</contextFuncName>
<contextNormFuncName>inrangeproc_9_1_15_0_9_1_s</contextNormFuncName>
<inlineStackInfo>
<count>1</count>
<item_version>0</item_version>
<item>
<first>/home/willychiang/Desktop/PYNQ-HelloWorld/boards/ip</first>
<second>
<count>1</count>
<item_version>0</item_version>
<item>
<first>
<first>/home/willychiang/Desktop/PYNQ-HelloWorld/boards/ip/vitis_lib/vision/L1/include/imgproc/xf_inrange.hpp</first>
<second>inrangeproc&lt;9, 1, 15, 0, 9, 1&gt;</second>
</first>
<second>56</second>
</item>
</second>
</item>
</inlineStackInfo>
<originalName/>
<rtlName>icmp_ln56_6_fu_412_p2</rtlName>
<control/>
<opType>icmp</opType>
<implIndex/>
<coreName/>
<coreId>1137</coreId>
</Obj>
<bitwidth>1</bitwidth>
</Value>
<oprand_edges>
<count>2</count>
<item_version>0</item_version>
<item>246</item>
<item>247</item>
</oprand_edges>
<opcode>icmp</opcode>
<m_Display>0</m_Display>
<m_isOnCriticalPath>0</m_isOnCriticalPath>
<m_isLCDNode>0</m_isLCDNode>
<m_isStartOfPath>0</m_isStartOfPath>
<m_delay>1.31</m_delay>
<m_topoIndex>56</m_topoIndex>
<m_clusterGroupNumber>-1</m_clusterGroupNumber>
</item>
<item class_id_reference="9" object_id="_79">
<Value>
<Obj>
<type>0</type>
<id>87</id>
<name>xor_ln56_6</name>
<fileName>/home/willychiang/Desktop/PYNQ-HelloWorld/boards/ip/vitis_lib/vision/L1/include/imgproc/xf_inrange.hpp</fileName>
<fileDirectory>..</fileDirectory>
<lineNumber>56</lineNumber>
<contextFuncName>inrangeproc&lt;9, 1, 15, 0, 9, 1&gt;</contextFuncName>
<contextNormFuncName>inrangeproc_9_1_15_0_9_1_s</contextNormFuncName>
<inlineStackInfo>
<count>1</count>
<item_version>0</item_version>
<item>
<first>/home/willychiang/Desktop/PYNQ-HelloWorld/boards/ip</first>
<second>
<count>1</count>
<item_version>0</item_version>
<item>
<first>
<first>/home/willychiang/Desktop/PYNQ-HelloWorld/boards/ip/vitis_lib/vision/L1/include/imgproc/xf_inrange.hpp</first>
<second>inrangeproc&lt;9, 1, 15, 0, 9, 1&gt;</second>
</first>
<second>56</second>
</item>
</second>
</item>
</inlineStackInfo>
<originalName/>
<rtlName>xor_ln56_6_fu_417_p2</rtlName>
<control/>
<opType>xor</opType>
<implIndex/>
<coreName/>
<coreId>13</coreId>
</Obj>
<bitwidth>1</bitwidth>
</Value>
<oprand_edges>
<count>2</count>
<item_version>0</item_version>
<item>248</item>
<item>249</item>
</oprand_edges>
<opcode>xor</opcode>
<m_Display>0</m_Display>
<m_isOnCriticalPath>0</m_isOnCriticalPath>
<m_isLCDNode>0</m_isLCDNode>
<m_isStartOfPath>0</m_isStartOfPath>
<m_delay>0.00</m_delay>
<m_topoIndex>57</m_topoIndex>
<m_clusterGroupNumber>2</m_clusterGroupNumber>
</item>
<item class_id_reference="9" object_id="_80">
<Value>
<Obj>
<type>0</type>
<id>88</id>
<name>icmp_ln890_3</name>
<fileName>/tools/Xilinx/Vitis_HLS/2020.2/common/technology/autopilot/ap_int_base.h</fileName>
<fileDirectory>..</fileDirectory>
<lineNumber>890</lineNumber>
<contextFuncName>operator&lt;=&lt;8, false&gt;</contextFuncName>
<contextNormFuncName>operator_le_8_false</contextNormFuncName>
<inlineStackInfo>
<count>1</count>
<item_version>0</item_version>
<item>
<first>/home/willychiang/Desktop/PYNQ-HelloWorld/boards/ip</first>
<second>
<count>1</count>
<item_version>0</item_version>
<item>
<first>
<first>/tools/Xilinx/Vitis_HLS/2020.2/common/technology/autopilot/ap_int_base.h</first>
<second>operator&lt;=&lt;8, false&gt;</second>
</first>
<second>890</second>
</item>
</second>
</item>
</inlineStackInfo>
<originalName/>
<rtlName>icmp_ln890_3_fu_423_p2</rtlName>
<control/>
<opType>icmp</opType>
<implIndex/>
<coreName/>
<coreId>132</coreId>
</Obj>
<bitwidth>1</bitwidth>
</Value>
<oprand_edges>
<count>2</count>
<item_version>0</item_version>
<item>250</item>
<item>251</item>
</oprand_edges>
<opcode>icmp</opcode>
<m_Display>0</m_Display>
<m_isOnCriticalPath>0</m_isOnCriticalPath>
<m_isLCDNode>0</m_isLCDNode>
<m_isStartOfPath>0</m_isStartOfPath>
<m_delay>1.31</m_delay>
<m_topoIndex>58</m_topoIndex>
<m_clusterGroupNumber>-1</m_clusterGroupNumber>
</item>
<item class_id_reference="9" object_id="_81">
<Value>
<Obj>
<type>0</type>
<id>89</id>
<name>xor_ln890_3</name>
<fileName>/tools/Xilinx/Vitis_HLS/2020.2/common/technology/autopilot/ap_int_base.h</fileName>
<fileDirectory>..</fileDirectory>
<lineNumber>890</lineNumber>
<contextFuncName>operator&lt;=&lt;8, false&gt;</contextFuncName>
<contextNormFuncName>operator_le_8_false</contextNormFuncName>
<inlineStackInfo>
<count>1</count>
<item_version>0</item_version>
<item>
<first>/home/willychiang/Desktop/PYNQ-HelloWorld/boards/ip</first>
<second>
<count>1</count>
<item_version>0</item_version>
<item>
<first>
<first>/tools/Xilinx/Vitis_HLS/2020.2/common/technology/autopilot/ap_int_base.h</first>
<second>operator&lt;=&lt;8, false&gt;</second>
</first>
<second>890</second>
</item>
</second>
</item>
</inlineStackInfo>
<originalName/>
<rtlName>xor_ln890_3_fu_428_p2</rtlName>
<control/>
<opType>xor</opType>
<implIndex/>
<coreName/>
<coreId>49</coreId>
</Obj>
<bitwidth>1</bitwidth>
</Value>
<oprand_edges>
<count>2</count>
<item_version>0</item_version>
<item>252</item>
<item>253</item>
</oprand_edges>
<opcode>xor</opcode>
<m_Display>0</m_Display>
<m_isOnCriticalPath>0</m_isOnCriticalPath>
<m_isLCDNode>0</m_isLCDNode>
<m_isStartOfPath>0</m_isStartOfPath>
<m_delay>0.00</m_delay>
<m_topoIndex>59</m_topoIndex>
<m_clusterGroupNumber>2</m_clusterGroupNumber>
</item>
<item class_id_reference="9" object_id="_82">
<Value>
<Obj>
<type>0</type>
<id>90</id>
<name>icmp_ln56_7</name>
<fileName>/home/willychiang/Desktop/PYNQ-HelloWorld/boards/ip/vitis_lib/vision/L1/include/imgproc/xf_inrange.hpp</fileName>
<fileDirectory>..</fileDirectory>
<lineNumber>56</lineNumber>
<contextFuncName>inrangeproc&lt;9, 1, 15, 0, 9, 1&gt;</contextFuncName>
<contextNormFuncName>inrangeproc_9_1_15_0_9_1_s</contextNormFuncName>
<inlineStackInfo>
<count>1</count>
<item_version>0</item_version>
<item>
<first>/home/willychiang/Desktop/PYNQ-HelloWorld/boards/ip</first>
<second>
<count>1</count>
<item_version>0</item_version>
<item>
<first>
<first>/home/willychiang/Desktop/PYNQ-HelloWorld/boards/ip/vitis_lib/vision/L1/include/imgproc/xf_inrange.hpp</first>
<second>inrangeproc&lt;9, 1, 15, 0, 9, 1&gt;</second>
</first>
<second>56</second>
</item>
</second>
</item>
</inlineStackInfo>
<originalName/>
<rtlName>icmp_ln56_7_fu_434_p2</rtlName>
<control/>
<opType>icmp</opType>
<implIndex/>
<coreName/>
<coreId>1</coreId>
</Obj>
<bitwidth>1</bitwidth>
</Value>
<oprand_edges>
<count>2</count>
<item_version>0</item_version>
<item>254</item>
<item>255</item>
</oprand_edges>
<opcode>icmp</opcode>
<m_Display>0</m_Display>
<m_isOnCriticalPath>0</m_isOnCriticalPath>
<m_isLCDNode>0</m_isLCDNode>
<m_isStartOfPath>0</m_isStartOfPath>
<m_delay>1.31</m_delay>
<m_topoIndex>60</m_topoIndex>
<m_clusterGroupNumber>-1</m_clusterGroupNumber>
</item>
<item class_id_reference="9" object_id="_83">
<Value>
<Obj>
<type>0</type>
<id>91</id>
<name>xor_ln56_7</name>
<fileName>/home/willychiang/Desktop/PYNQ-HelloWorld/boards/ip/vitis_lib/vision/L1/include/imgproc/xf_inrange.hpp</fileName>
<fileDirectory>..</fileDirectory>
<lineNumber>56</lineNumber>
<contextFuncName>inrangeproc&lt;9, 1, 15, 0, 9, 1&gt;</contextFuncName>
<contextNormFuncName>inrangeproc_9_1_15_0_9_1_s</contextNormFuncName>
<inlineStackInfo>
<count>1</count>
<item_version>0</item_version>
<item>
<first>/home/willychiang/Desktop/PYNQ-HelloWorld/boards/ip</first>
<second>
<count>1</count>
<item_version>0</item_version>
<item>
<first>
<first>/home/willychiang/Desktop/PYNQ-HelloWorld/boards/ip/vitis_lib/vision/L1/include/imgproc/xf_inrange.hpp</first>
<second>inrangeproc&lt;9, 1, 15, 0, 9, 1&gt;</second>
</first>
<second>56</second>
</item>
</second>
</item>
</inlineStackInfo>
<originalName/>
<rtlName>xor_ln56_7_fu_439_p2</rtlName>
<control/>
<opType>xor</opType>
<implIndex/>
<coreName/>
<coreId>4294967295</coreId>
</Obj>
<bitwidth>1</bitwidth>
</Value>
<oprand_edges>
<count>2</count>
<item_version>0</item_version>
<item>256</item>
<item>257</item>
</oprand_edges>
<opcode>xor</opcode>
<m_Display>0</m_Display>
<m_isOnCriticalPath>0</m_isOnCriticalPath>
<m_isLCDNode>0</m_isLCDNode>
<m_isStartOfPath>0</m_isStartOfPath>
<m_delay>0.00</m_delay>
<m_topoIndex>61</m_topoIndex>
<m_clusterGroupNumber>2</m_clusterGroupNumber>
</item>
<item class_id_reference="9" object_id="_84">
<Value>
<Obj>
<type>0</type>
<id>92</id>
<name>and_ln1348_7</name>
<fileName>/tools/Xilinx/Vitis_HLS/2020.2/common/technology/autopilot/ap_int_base.h</fileName>
<fileDirectory>..</fileDirectory>
<lineNumber>1348</lineNumber>
<contextFuncName>operator&amp;&lt;8, false, 8, false&gt;</contextFuncName>
<contextNormFuncName>operator_8_false_8_false_s</contextNormFuncName>
<inlineStackInfo>
<count>1</count>
<item_version>0</item_version>
<item>
<first>/home/willychiang/Desktop/PYNQ-HelloWorld/boards/ip</first>
<second>
<count>1</count>
<item_version>0</item_version>
<item>
<first>
<first>/tools/Xilinx/Vitis_HLS/2020.2/common/technology/autopilot/ap_int_base.h</first>
<second>operator&amp;&lt;8, false, 8, false&gt;</second>
</first>
<second>1348</second>
</item>
</second>
</item>
</inlineStackInfo>
<originalName/>
<rtlName>and_ln1348_7_fu_445_p2</rtlName>
<control/>
<opType>and</opType>
<implIndex/>
<coreName/>
<coreId>1345</coreId>
</Obj>
<bitwidth>1</bitwidth>
</Value>
<oprand_edges>
<count>2</count>
<item_version>0</item_version>
<item>258</item>
<item>259</item>
</oprand_edges>
<opcode>and</opcode>
<m_Display>0</m_Display>
<m_isOnCriticalPath>0</m_isOnCriticalPath>
<m_isLCDNode>0</m_isLCDNode>
<m_isStartOfPath>0</m_isStartOfPath>
<m_delay>0.00</m_delay>
<m_topoIndex>62</m_topoIndex>
<m_clusterGroupNumber>2</m_clusterGroupNumber>
</item>
<item class_id_reference="9" object_id="_85">
<Value>
<Obj>
<type>0</type>
<id>93</id>
<name>and_ln1348_8</name>
<fileName>/tools/Xilinx/Vitis_HLS/2020.2/common/technology/autopilot/ap_int_base.h</fileName>
<fileDirectory>..</fileDirectory>
<lineNumber>1348</lineNumber>
<contextFuncName>operator&amp;&lt;8, false, 8, false&gt;</contextFuncName>
<contextNormFuncName>operator_8_false_8_false_s</contextNormFuncName>
<inlineStackInfo>
<count>1</count>
<item_version>0</item_version>
<item>
<first>/home/willychiang/Desktop/PYNQ-HelloWorld/boards/ip</first>
<second>
<count>1</count>
<item_version>0</item_version>
<item>
<first>
<first>/tools/Xilinx/Vitis_HLS/2020.2/common/technology/autopilot/ap_int_base.h</first>
<second>operator&amp;&lt;8, false, 8, false&gt;</second>
</first>
<second>1348</second>
</item>
</second>
</item>
</inlineStackInfo>
<originalName/>
<rtlName>and_ln1348_8_fu_451_p2</rtlName>
<control/>
<opType>and</opType>
<implIndex/>
<coreName/>
<coreId>3579983936</coreId>
</Obj>
<bitwidth>1</bitwidth>
</Value>
<oprand_edges>
<count>2</count>
<item_version>0</item_version>
<item>260</item>
<item>261</item>
</oprand_edges>
<opcode>and</opcode>
<m_Display>0</m_Display>
<m_isOnCriticalPath>0</m_isOnCriticalPath>
<m_isLCDNode>0</m_isLCDNode>
<m_isStartOfPath>0</m_isStartOfPath>
<m_delay>0.00</m_delay>
<m_topoIndex>63</m_topoIndex>
<m_clusterGroupNumber>2</m_clusterGroupNumber>
</item>
<item class_id_reference="9" object_id="_86">
<Value>
<Obj>
<type>0</type>
<id>94</id>
<name>and_ln1348_9</name>
<fileName>/tools/Xilinx/Vitis_HLS/2020.2/common/technology/autopilot/ap_int_base.h</fileName>
<fileDirectory>..</fileDirectory>
<lineNumber>1348</lineNumber>
<contextFuncName>operator&amp;&lt;8, false, 8, false&gt;</contextFuncName>
<contextNormFuncName>operator_8_false_8_false_s</contextNormFuncName>
<inlineStackInfo>
<count>1</count>
<item_version>0</item_version>
<item>
<first>/home/willychiang/Desktop/PYNQ-HelloWorld/boards/ip</first>
<second>
<count>1</count>
<item_version>0</item_version>
<item>
<first>
<first>/tools/Xilinx/Vitis_HLS/2020.2/common/technology/autopilot/ap_int_base.h</first>
<second>operator&amp;&lt;8, false, 8, false&gt;</second>
</first>
<second>1348</second>
</item>
</second>
</item>
</inlineStackInfo>
<originalName/>
<rtlName>and_ln1348_9_fu_457_p2</rtlName>
<control/>
<opType>and</opType>
<implIndex/>
<coreName/>
<coreId>132</coreId>
</Obj>
<bitwidth>1</bitwidth>
</Value>
<oprand_edges>
<count>2</count>
<item_version>0</item_version>
<item>262</item>
<item>263</item>
</oprand_edges>
<opcode>and</opcode>
<m_Display>0</m_Display>
<m_isOnCriticalPath>0</m_isOnCriticalPath>
<m_isLCDNode>0</m_isLCDNode>
<m_isStartOfPath>0</m_isStartOfPath>
<m_delay>0.00</m_delay>
<m_topoIndex>64</m_topoIndex>
<m_clusterGroupNumber>2</m_clusterGroupNumber>
</item>
<item class_id_reference="9" object_id="_87">
<Value>
<Obj>
<type>0</type>
<id>95</id>
<name>and_ln1348_10</name>
<fileName>/tools/Xilinx/Vitis_HLS/2020.2/common/technology/autopilot/ap_int_base.h</fileName>
<fileDirectory>..</fileDirectory>
<lineNumber>1348</lineNumber>
<contextFuncName>operator&amp;&lt;8, false, 8, false&gt;</contextFuncName>
<contextNormFuncName>operator_8_false_8_false_s</contextNormFuncName>
<inlineStackInfo>
<count>1</count>
<item_version>0</item_version>
<item>
<first>/home/willychiang/Desktop/PYNQ-HelloWorld/boards/ip</first>
<second>
<count>1</count>
<item_version>0</item_version>
<item>
<first>
<first>/tools/Xilinx/Vitis_HLS/2020.2/common/technology/autopilot/ap_int_base.h</first>
<second>operator&amp;&lt;8, false, 8, false&gt;</second>
</first>
<second>1348</second>
</item>
</second>
</item>
</inlineStackInfo>
<originalName/>
<rtlName>and_ln1348_10_fu_463_p2</rtlName>
<control/>
<opType>and</opType>
<implIndex/>
<coreName/>
<coreId>511</coreId>
</Obj>
<bitwidth>1</bitwidth>
</Value>
<oprand_edges>
<count>2</count>
<item_version>0</item_version>
<item>264</item>
<item>265</item>
</oprand_edges>
<opcode>and</opcode>
<m_Display>0</m_Display>
<m_isOnCriticalPath>0</m_isOnCriticalPath>
<m_isLCDNode>0</m_isLCDNode>
<m_isStartOfPath>0</m_isStartOfPath>
<m_delay>0.00</m_delay>
<m_topoIndex>65</m_topoIndex>
<m_clusterGroupNumber>2</m_clusterGroupNumber>
</item>
<item class_id_reference="9" object_id="_88">
<Value>
<Obj>
<type>0</type>
<id>96</id>
<name>and_ln1348_3</name>
<fileName>/tools/Xilinx/Vitis_HLS/2020.2/common/technology/autopilot/ap_int_base.h</fileName>
<fileDirectory>..</fileDirectory>
<lineNumber>1348</lineNumber>
<contextFuncName>operator&amp;&lt;8, false, 8, false&gt;</contextFuncName>
<contextNormFuncName>operator_8_false_8_false_s</contextNormFuncName>
<inlineStackInfo>
<count>1</count>
<item_version>0</item_version>
<item>
<first>/home/willychiang/Desktop/PYNQ-HelloWorld/boards/ip</first>
<second>
<count>1</count>
<item_version>0</item_version>
<item>
<first>
<first>/tools/Xilinx/Vitis_HLS/2020.2/common/technology/autopilot/ap_int_base.h</first>
<second>operator&amp;&lt;8, false, 8, false&gt;</second>
</first>
<second>1348</second>
</item>
</second>
</item>
</inlineStackInfo>
<originalName/>
<rtlName>and_ln1348_3_fu_469_p2</rtlName>
<control/>
<opType>and</opType>
<implIndex/>
<coreName/>
<coreId>49</coreId>
</Obj>
<bitwidth>1</bitwidth>
</Value>
<oprand_edges>
<count>2</count>
<item_version>0</item_version>
<item>266</item>
<item>267</item>
</oprand_edges>
<opcode>and</opcode>
<m_Display>0</m_Display>
<m_isOnCriticalPath>0</m_isOnCriticalPath>
<m_isLCDNode>0</m_isLCDNode>
<m_isStartOfPath>0</m_isStartOfPath>
<m_delay>0.80</m_delay>
<m_topoIndex>66</m_topoIndex>
<m_clusterGroupNumber>2</m_clusterGroupNumber>
</item>
<item class_id_reference="9" object_id="_89">
<Value>
<Obj>
<type>0</type>
<id>97</id>
<name>icmp_ln56_8</name>
<fileName>/home/willychiang/Desktop/PYNQ-HelloWorld/boards/ip/vitis_lib/vision/L1/include/imgproc/xf_inrange.hpp</fileName>
<fileDirectory>..</fileDirectory>
<lineNumber>56</lineNumber>
<contextFuncName>inrangeproc&lt;9, 1, 15, 0, 9, 1&gt;</contextFuncName>
<contextNormFuncName>inrangeproc_9_1_15_0_9_1_s</contextNormFuncName>
<inlineStackInfo>
<count>1</count>
<item_version>0</item_version>
<item>
<first>/home/willychiang/Desktop/PYNQ-HelloWorld/boards/ip</first>
<second>
<count>1</count>
<item_version>0</item_version>
<item>
<first>
<first>/home/willychiang/Desktop/PYNQ-HelloWorld/boards/ip/vitis_lib/vision/L1/include/imgproc/xf_inrange.hpp</first>
<second>inrangeproc&lt;9, 1, 15, 0, 9, 1&gt;</second>
</first>
<second>56</second>
</item>
</second>
</item>
</inlineStackInfo>
<originalName/>
<rtlName>icmp_ln56_8_fu_475_p2</rtlName>
<control/>
<opType>icmp</opType>
<implIndex/>
<coreName/>
<coreId>49</coreId>
</Obj>
<bitwidth>1</bitwidth>
</Value>
<oprand_edges>
<count>2</count>
<item_version>0</item_version>
<item>268</item>
<item>269</item>
</oprand_edges>
<opcode>icmp</opcode>
<m_Display>0</m_Display>
<m_isOnCriticalPath>0</m_isOnCriticalPath>
<m_isLCDNode>0</m_isLCDNode>
<m_isStartOfPath>0</m_isStartOfPath>
<m_delay>1.31</m_delay>
<m_topoIndex>67</m_topoIndex>
<m_clusterGroupNumber>-1</m_clusterGroupNumber>
</item>
<item class_id_reference="9" object_id="_90">
<Value>
<Obj>
<type>0</type>
<id>98</id>
<name>xor_ln56_8</name>
<fileName>/home/willychiang/Desktop/PYNQ-HelloWorld/boards/ip/vitis_lib/vision/L1/include/imgproc/xf_inrange.hpp</fileName>
<fileDirectory>..</fileDirectory>
<lineNumber>56</lineNumber>
<contextFuncName>inrangeproc&lt;9, 1, 15, 0, 9, 1&gt;</contextFuncName>
<contextNormFuncName>inrangeproc_9_1_15_0_9_1_s</contextNormFuncName>
<inlineStackInfo>
<count>1</count>
<item_version>0</item_version>
<item>
<first>/home/willychiang/Desktop/PYNQ-HelloWorld/boards/ip</first>
<second>
<count>1</count>
<item_version>0</item_version>
<item>
<first>
<first>/home/willychiang/Desktop/PYNQ-HelloWorld/boards/ip/vitis_lib/vision/L1/include/imgproc/xf_inrange.hpp</first>
<second>inrangeproc&lt;9, 1, 15, 0, 9, 1&gt;</second>
</first>
<second>56</second>
</item>
</second>
</item>
</inlineStackInfo>
<originalName/>
<rtlName>xor_ln56_8_fu_480_p2</rtlName>
<control/>
<opType>xor</opType>
<implIndex/>
<coreName/>
<coreId>3579930585</coreId>
</Obj>
<bitwidth>1</bitwidth>
</Value>
<oprand_edges>
<count>2</count>
<item_version>0</item_version>
<item>270</item>
<item>271</item>
</oprand_edges>
<opcode>xor</opcode>
<m_Display>0</m_Display>
<m_isOnCriticalPath>0</m_isOnCriticalPath>
<m_isLCDNode>0</m_isLCDNode>
<m_isStartOfPath>0</m_isStartOfPath>
<m_delay>0.00</m_delay>
<m_topoIndex>68</m_topoIndex>
<m_clusterGroupNumber>3</m_clusterGroupNumber>
</item>
<item class_id_reference="9" object_id="_91">
<Value>
<Obj>
<type>0</type>
<id>99</id>
<name>icmp_ln56_9</name>
<fileName>/home/willychiang/Desktop/PYNQ-HelloWorld/boards/ip/vitis_lib/vision/L1/include/imgproc/xf_inrange.hpp</fileName>
<fileDirectory>..</fileDirectory>
<lineNumber>56</lineNumber>
<contextFuncName>inrangeproc&lt;9, 1, 15, 0, 9, 1&gt;</contextFuncName>
<contextNormFuncName>inrangeproc_9_1_15_0_9_1_s</contextNormFuncName>
<inlineStackInfo>
<count>1</count>
<item_version>0</item_version>
<item>
<first>/home/willychiang/Desktop/PYNQ-HelloWorld/boards/ip</first>
<second>
<count>1</count>
<item_version>0</item_version>
<item>
<first>
<first>/home/willychiang/Desktop/PYNQ-HelloWorld/boards/ip/vitis_lib/vision/L1/include/imgproc/xf_inrange.hpp</first>
<second>inrangeproc&lt;9, 1, 15, 0, 9, 1&gt;</second>
</first>
<second>56</second>
</item>
</second>
</item>
</inlineStackInfo>
<originalName/>
<rtlName>icmp_ln56_9_fu_486_p2</rtlName>
<control/>
<opType>icmp</opType>
<implIndex/>
<coreName/>
<coreId>1601</coreId>
</Obj>
<bitwidth>1</bitwidth>
</Value>
<oprand_edges>
<count>2</count>
<item_version>0</item_version>
<item>272</item>
<item>273</item>
</oprand_edges>
<opcode>icmp</opcode>
<m_Display>0</m_Display>
<m_isOnCriticalPath>0</m_isOnCriticalPath>
<m_isLCDNode>0</m_isLCDNode>
<m_isStartOfPath>0</m_isStartOfPath>
<m_delay>1.31</m_delay>
<m_topoIndex>69</m_topoIndex>
<m_clusterGroupNumber>-1</m_clusterGroupNumber>
</item>
<item class_id_reference="9" object_id="_92">
<Value>
<Obj>
<type>0</type>
<id>100</id>
<name>xor_ln56_9</name>
<fileName>/home/willychiang/Desktop/PYNQ-HelloWorld/boards/ip/vitis_lib/vision/L1/include/imgproc/xf_inrange.hpp</fileName>
<fileDirectory>..</fileDirectory>
<lineNumber>56</lineNumber>
<contextFuncName>inrangeproc&lt;9, 1, 15, 0, 9, 1&gt;</contextFuncName>
<contextNormFuncName>inrangeproc_9_1_15_0_9_1_s</contextNormFuncName>
<inlineStackInfo>
<count>1</count>
<item_version>0</item_version>
<item>
<first>/home/willychiang/Desktop/PYNQ-HelloWorld/boards/ip</first>
<second>
<count>1</count>
<item_version>0</item_version>
<item>
<first>
<first>/home/willychiang/Desktop/PYNQ-HelloWorld/boards/ip/vitis_lib/vision/L1/include/imgproc/xf_inrange.hpp</first>
<second>inrangeproc&lt;9, 1, 15, 0, 9, 1&gt;</second>
</first>
<second>56</second>
</item>
</second>
</item>
</inlineStackInfo>
<originalName/>
<rtlName>xor_ln56_9_fu_491_p2</rtlName>
<control/>
<opType>xor</opType>
<implIndex/>
<coreName/>
<coreId>3579952080</coreId>
</Obj>
<bitwidth>1</bitwidth>
</Value>
<oprand_edges>
<count>2</count>
<item_version>0</item_version>
<item>274</item>
<item>275</item>
</oprand_edges>
<opcode>xor</opcode>
<m_Display>0</m_Display>
<m_isOnCriticalPath>0</m_isOnCriticalPath>
<m_isLCDNode>0</m_isLCDNode>
<m_isStartOfPath>0</m_isStartOfPath>
<m_delay>0.00</m_delay>
<m_topoIndex>70</m_topoIndex>
<m_clusterGroupNumber>3</m_clusterGroupNumber>
</item>
<item class_id_reference="9" object_id="_93">
<Value>
<Obj>
<type>0</type>
<id>101</id>
<name>icmp_ln890_4</name>
<fileName>/tools/Xilinx/Vitis_HLS/2020.2/common/technology/autopilot/ap_int_base.h</fileName>
<fileDirectory>..</fileDirectory>
<lineNumber>890</lineNumber>
<contextFuncName>operator&lt;=&lt;8, false&gt;</contextFuncName>
<contextNormFuncName>operator_le_8_false</contextNormFuncName>
<inlineStackInfo>
<count>1</count>
<item_version>0</item_version>
<item>
<first>/home/willychiang/Desktop/PYNQ-HelloWorld/boards/ip</first>
<second>
<count>1</count>
<item_version>0</item_version>
<item>
<first>
<first>/tools/Xilinx/Vitis_HLS/2020.2/common/technology/autopilot/ap_int_base.h</first>
<second>operator&lt;=&lt;8, false&gt;</second>
</first>
<second>890</second>
</item>
</second>
</item>
</inlineStackInfo>
<originalName/>
<rtlName>icmp_ln890_4_fu_497_p2</rtlName>
<control/>
<opType>icmp</opType>
<implIndex/>
<coreName/>
<coreId>0</coreId>
</Obj>
<bitwidth>1</bitwidth>
</Value>
<oprand_edges>
<count>2</count>
<item_version>0</item_version>
<item>276</item>
<item>277</item>
</oprand_edges>
<opcode>icmp</opcode>
<m_Display>0</m_Display>
<m_isOnCriticalPath>0</m_isOnCriticalPath>
<m_isLCDNode>0</m_isLCDNode>
<m_isStartOfPath>0</m_isStartOfPath>
<m_delay>1.31</m_delay>
<m_topoIndex>71</m_topoIndex>
<m_clusterGroupNumber>-1</m_clusterGroupNumber>
</item>
<item class_id_reference="9" object_id="_94">
<Value>
<Obj>
<type>0</type>
<id>102</id>
<name>xor_ln890_4</name>
<fileName>/tools/Xilinx/Vitis_HLS/2020.2/common/technology/autopilot/ap_int_base.h</fileName>
<fileDirectory>..</fileDirectory>
<lineNumber>890</lineNumber>
<contextFuncName>operator&lt;=&lt;8, false&gt;</contextFuncName>
<contextNormFuncName>operator_le_8_false</contextNormFuncName>
<inlineStackInfo>
<count>1</count>
<item_version>0</item_version>
<item>
<first>/home/willychiang/Desktop/PYNQ-HelloWorld/boards/ip</first>
<second>
<count>1</count>
<item_version>0</item_version>
<item>
<first>
<first>/tools/Xilinx/Vitis_HLS/2020.2/common/technology/autopilot/ap_int_base.h</first>
<second>operator&lt;=&lt;8, false&gt;</second>
</first>
<second>890</second>
</item>
</second>
</item>
</inlineStackInfo>
<originalName/>
<rtlName>xor_ln890_4_fu_502_p2</rtlName>
<control/>
<opType>xor</opType>
<implIndex/>
<coreName/>
<coreId>0</coreId>
</Obj>
<bitwidth>1</bitwidth>
</Value>
<oprand_edges>
<count>2</count>
<item_version>0</item_version>
<item>278</item>
<item>279</item>
</oprand_edges>
<opcode>xor</opcode>
<m_Display>0</m_Display>
<m_isOnCriticalPath>0</m_isOnCriticalPath>
<m_isLCDNode>0</m_isLCDNode>
<m_isStartOfPath>0</m_isStartOfPath>
<m_delay>0.00</m_delay>
<m_topoIndex>72</m_topoIndex>
<m_clusterGroupNumber>3</m_clusterGroupNumber>
</item>
<item class_id_reference="9" object_id="_95">
<Value>
<Obj>
<type>0</type>
<id>103</id>
<name>icmp_ln56_10</name>
<fileName>/home/willychiang/Desktop/PYNQ-HelloWorld/boards/ip/vitis_lib/vision/L1/include/imgproc/xf_inrange.hpp</fileName>
<fileDirectory>..</fileDirectory>
<lineNumber>56</lineNumber>
<contextFuncName>inrangeproc&lt;9, 1, 15, 0, 9, 1&gt;</contextFuncName>
<contextNormFuncName>inrangeproc_9_1_15_0_9_1_s</contextNormFuncName>
<inlineStackInfo>
<count>1</count>
<item_version>0</item_version>
<item>
<first>/home/willychiang/Desktop/PYNQ-HelloWorld/boards/ip</first>
<second>
<count>1</count>
<item_version>0</item_version>
<item>
<first>
<first>/home/willychiang/Desktop/PYNQ-HelloWorld/boards/ip/vitis_lib/vision/L1/include/imgproc/xf_inrange.hpp</first>
<second>inrangeproc&lt;9, 1, 15, 0, 9, 1&gt;</second>
</first>
<second>56</second>
</item>
</second>
</item>
</inlineStackInfo>
<originalName/>
<rtlName>icmp_ln56_10_fu_508_p2</rtlName>
<control/>
<opType>icmp</opType>
<implIndex/>
<coreName/>
<coreId>0</coreId>
</Obj>
<bitwidth>1</bitwidth>
</Value>
<oprand_edges>
<count>2</count>
<item_version>0</item_version>
<item>280</item>
<item>281</item>
</oprand_edges>
<opcode>icmp</opcode>
<m_Display>0</m_Display>
<m_isOnCriticalPath>0</m_isOnCriticalPath>
<m_isLCDNode>0</m_isLCDNode>
<m_isStartOfPath>0</m_isStartOfPath>
<m_delay>1.31</m_delay>
<m_topoIndex>73</m_topoIndex>
<m_clusterGroupNumber>-1</m_clusterGroupNumber>
</item>
<item class_id_reference="9" object_id="_96">
<Value>
<Obj>
<type>0</type>
<id>104</id>
<name>xor_ln56_10</name>
<fileName>/home/willychiang/Desktop/PYNQ-HelloWorld/boards/ip/vitis_lib/vision/L1/include/imgproc/xf_inrange.hpp</fileName>
<fileDirectory>..</fileDirectory>
<lineNumber>56</lineNumber>
<contextFuncName>inrangeproc&lt;9, 1, 15, 0, 9, 1&gt;</contextFuncName>
<contextNormFuncName>inrangeproc_9_1_15_0_9_1_s</contextNormFuncName>
<inlineStackInfo>
<count>1</count>
<item_version>0</item_version>
<item>
<first>/home/willychiang/Desktop/PYNQ-HelloWorld/boards/ip</first>
<second>
<count>1</count>
<item_version>0</item_version>
<item>
<first>
<first>/home/willychiang/Desktop/PYNQ-HelloWorld/boards/ip/vitis_lib/vision/L1/include/imgproc/xf_inrange.hpp</first>
<second>inrangeproc&lt;9, 1, 15, 0, 9, 1&gt;</second>
</first>
<second>56</second>
</item>
</second>
</item>
</inlineStackInfo>
<originalName/>
<rtlName>xor_ln56_10_fu_513_p2</rtlName>
<control/>
<opType>xor</opType>
<implIndex/>
<coreName/>
<coreId>0</coreId>
</Obj>
<bitwidth>1</bitwidth>
</Value>
<oprand_edges>
<count>2</count>
<item_version>0</item_version>
<item>282</item>
<item>283</item>
</oprand_edges>
<opcode>xor</opcode>
<m_Display>0</m_Display>
<m_isOnCriticalPath>0</m_isOnCriticalPath>
<m_isLCDNode>0</m_isLCDNode>
<m_isStartOfPath>0</m_isStartOfPath>
<m_delay>0.00</m_delay>
<m_topoIndex>74</m_topoIndex>
<m_clusterGroupNumber>3</m_clusterGroupNumber>
</item>
<item class_id_reference="9" object_id="_97">
<Value>
<Obj>
<type>0</type>
<id>105</id>
<name>icmp_ln890_5</name>
<fileName>/tools/Xilinx/Vitis_HLS/2020.2/common/technology/autopilot/ap_int_base.h</fileName>
<fileDirectory>..</fileDirectory>
<lineNumber>890</lineNumber>
<contextFuncName>operator&lt;=&lt;8, false&gt;</contextFuncName>
<contextNormFuncName>operator_le_8_false</contextNormFuncName>
<inlineStackInfo>
<count>1</count>
<item_version>0</item_version>
<item>
<first>/home/willychiang/Desktop/PYNQ-HelloWorld/boards/ip</first>
<second>
<count>1</count>
<item_version>0</item_version>
<item>
<first>
<first>/tools/Xilinx/Vitis_HLS/2020.2/common/technology/autopilot/ap_int_base.h</first>
<second>operator&lt;=&lt;8, false&gt;</second>
</first>
<second>890</second>
</item>
</second>
</item>
</inlineStackInfo>
<originalName/>
<rtlName>icmp_ln890_5_fu_519_p2</rtlName>
<control/>
<opType>icmp</opType>
<implIndex/>
<coreName/>
<coreId>49</coreId>
</Obj>
<bitwidth>1</bitwidth>
</Value>
<oprand_edges>
<count>2</count>
<item_version>0</item_version>
<item>284</item>
<item>285</item>
</oprand_edges>
<opcode>icmp</opcode>
<m_Display>0</m_Display>
<m_isOnCriticalPath>0</m_isOnCriticalPath>
<m_isLCDNode>0</m_isLCDNode>
<m_isStartOfPath>0</m_isStartOfPath>
<m_delay>1.31</m_delay>
<m_topoIndex>75</m_topoIndex>
<m_clusterGroupNumber>-1</m_clusterGroupNumber>
</item>
<item class_id_reference="9" object_id="_98">
<Value>
<Obj>
<type>0</type>
<id>106</id>
<name>xor_ln890_5</name>
<fileName>/tools/Xilinx/Vitis_HLS/2020.2/common/technology/autopilot/ap_int_base.h</fileName>
<fileDirectory>..</fileDirectory>
<lineNumber>890</lineNumber>
<contextFuncName>operator&lt;=&lt;8, false&gt;</contextFuncName>
<contextNormFuncName>operator_le_8_false</contextNormFuncName>
<inlineStackInfo>
<count>1</count>
<item_version>0</item_version>
<item>
<first>/home/willychiang/Desktop/PYNQ-HelloWorld/boards/ip</first>
<second>
<count>1</count>
<item_version>0</item_version>
<item>
<first>
<first>/tools/Xilinx/Vitis_HLS/2020.2/common/technology/autopilot/ap_int_base.h</first>
<second>operator&lt;=&lt;8, false&gt;</second>
</first>
<second>890</second>
</item>
</second>
</item>
</inlineStackInfo>
<originalName/>
<rtlName>xor_ln890_5_fu_524_p2</rtlName>
<control/>
<opType>xor</opType>
<implIndex/>
<coreName/>
<coreId>3578891320</coreId>
</Obj>
<bitwidth>1</bitwidth>
</Value>
<oprand_edges>
<count>2</count>
<item_version>0</item_version>
<item>286</item>
<item>287</item>
</oprand_edges>
<opcode>xor</opcode>
<m_Display>0</m_Display>
<m_isOnCriticalPath>0</m_isOnCriticalPath>
<m_isLCDNode>0</m_isLCDNode>
<m_isStartOfPath>0</m_isStartOfPath>
<m_delay>0.00</m_delay>
<m_topoIndex>76</m_topoIndex>
<m_clusterGroupNumber>3</m_clusterGroupNumber>
</item>
<item class_id_reference="9" object_id="_99">
<Value>
<Obj>
<type>0</type>
<id>107</id>
<name>icmp_ln56_11</name>
<fileName>/home/willychiang/Desktop/PYNQ-HelloWorld/boards/ip/vitis_lib/vision/L1/include/imgproc/xf_inrange.hpp</fileName>
<fileDirectory>..</fileDirectory>
<lineNumber>56</lineNumber>
<contextFuncName>inrangeproc&lt;9, 1, 15, 0, 9, 1&gt;</contextFuncName>
<contextNormFuncName>inrangeproc_9_1_15_0_9_1_s</contextNormFuncName>
<inlineStackInfo>
<count>1</count>
<item_version>0</item_version>
<item>
<first>/home/willychiang/Desktop/PYNQ-HelloWorld/boards/ip</first>
<second>
<count>1</count>
<item_version>0</item_version>
<item>
<first>
<first>/home/willychiang/Desktop/PYNQ-HelloWorld/boards/ip/vitis_lib/vision/L1/include/imgproc/xf_inrange.hpp</first>
<second>inrangeproc&lt;9, 1, 15, 0, 9, 1&gt;</second>
</first>
<second>56</second>
</item>
</second>
</item>
</inlineStackInfo>
<originalName/>
<rtlName>icmp_ln56_11_fu_530_p2</rtlName>
<control/>
<opType>icmp</opType>
<implIndex/>
<coreName/>
<coreId>1729</coreId>
</Obj>
<bitwidth>1</bitwidth>
</Value>
<oprand_edges>
<count>2</count>
<item_version>0</item_version>
<item>288</item>
<item>289</item>
</oprand_edges>
<opcode>icmp</opcode>
<m_Display>0</m_Display>
<m_isOnCriticalPath>0</m_isOnCriticalPath>
<m_isLCDNode>0</m_isLCDNode>
<m_isStartOfPath>0</m_isStartOfPath>
<m_delay>1.31</m_delay>
<m_topoIndex>77</m_topoIndex>
<m_clusterGroupNumber>-1</m_clusterGroupNumber>
</item>
<item class_id_reference="9" object_id="_100">
<Value>
<Obj>
<type>0</type>
<id>108</id>
<name>xor_ln56_11</name>
<fileName>/home/willychiang/Desktop/PYNQ-HelloWorld/boards/ip/vitis_lib/vision/L1/include/imgproc/xf_inrange.hpp</fileName>
<fileDirectory>..</fileDirectory>
<lineNumber>56</lineNumber>
<contextFuncName>inrangeproc&lt;9, 1, 15, 0, 9, 1&gt;</contextFuncName>
<contextNormFuncName>inrangeproc_9_1_15_0_9_1_s</contextNormFuncName>
<inlineStackInfo>
<count>1</count>
<item_version>0</item_version>
<item>
<first>/home/willychiang/Desktop/PYNQ-HelloWorld/boards/ip</first>
<second>
<count>1</count>
<item_version>0</item_version>
<item>
<first>
<first>/home/willychiang/Desktop/PYNQ-HelloWorld/boards/ip/vitis_lib/vision/L1/include/imgproc/xf_inrange.hpp</first>
<second>inrangeproc&lt;9, 1, 15, 0, 9, 1&gt;</second>
</first>
<second>56</second>
</item>
</second>
</item>
</inlineStackInfo>
<originalName/>
<rtlName>xor_ln56_11_fu_535_p2</rtlName>
<control/>
<opType>xor</opType>
<implIndex/>
<coreName/>
<coreId>0</coreId>
</Obj>
<bitwidth>1</bitwidth>
</Value>
<oprand_edges>
<count>2</count>
<item_version>0</item_version>
<item>290</item>
<item>291</item>
</oprand_edges>
<opcode>xor</opcode>
<m_Display>0</m_Display>
<m_isOnCriticalPath>0</m_isOnCriticalPath>
<m_isLCDNode>0</m_isLCDNode>
<m_isStartOfPath>0</m_isStartOfPath>
<m_delay>0.00</m_delay>
<m_topoIndex>78</m_topoIndex>
<m_clusterGroupNumber>3</m_clusterGroupNumber>
</item>
<item class_id_reference="9" object_id="_101">
<Value>
<Obj>
<type>0</type>
<id>109</id>
<name>and_ln1348_11</name>
<fileName>/tools/Xilinx/Vitis_HLS/2020.2/common/technology/autopilot/ap_int_base.h</fileName>
<fileDirectory>..</fileDirectory>
<lineNumber>1348</lineNumber>
<contextFuncName>operator&amp;&lt;8, false, 8, false&gt;</contextFuncName>
<contextNormFuncName>operator_8_false_8_false_s</contextNormFuncName>
<inlineStackInfo>
<count>1</count>
<item_version>0</item_version>
<item>
<first>/home/willychiang/Desktop/PYNQ-HelloWorld/boards/ip</first>
<second>
<count>1</count>
<item_version>0</item_version>
<item>
<first>
<first>/tools/Xilinx/Vitis_HLS/2020.2/common/technology/autopilot/ap_int_base.h</first>
<second>operator&amp;&lt;8, false, 8, false&gt;</second>
</first>
<second>1348</second>
</item>
</second>
</item>
</inlineStackInfo>
<originalName/>
<rtlName>and_ln1348_11_fu_541_p2</rtlName>
<control/>
<opType>and</opType>
<implIndex/>
<coreName/>
<coreId>132</coreId>
</Obj>
<bitwidth>1</bitwidth>
</Value>
<oprand_edges>
<count>2</count>
<item_version>0</item_version>
<item>292</item>
<item>293</item>
</oprand_edges>
<opcode>and</opcode>
<m_Display>0</m_Display>
<m_isOnCriticalPath>0</m_isOnCriticalPath>
<m_isLCDNode>0</m_isLCDNode>
<m_isStartOfPath>0</m_isStartOfPath>
<m_delay>0.00</m_delay>
<m_topoIndex>79</m_topoIndex>
<m_clusterGroupNumber>3</m_clusterGroupNumber>
</item>
<item class_id_reference="9" object_id="_102">
<Value>
<Obj>
<type>0</type>
<id>110</id>
<name>and_ln1348_12</name>
<fileName>/tools/Xilinx/Vitis_HLS/2020.2/common/technology/autopilot/ap_int_base.h</fileName>
<fileDirectory>..</fileDirectory>
<lineNumber>1348</lineNumber>
<contextFuncName>operator&amp;&lt;8, false, 8, false&gt;</contextFuncName>
<contextNormFuncName>operator_8_false_8_false_s</contextNormFuncName>
<inlineStackInfo>
<count>1</count>
<item_version>0</item_version>
<item>
<first>/home/willychiang/Desktop/PYNQ-HelloWorld/boards/ip</first>
<second>
<count>1</count>
<item_version>0</item_version>
<item>
<first>
<first>/tools/Xilinx/Vitis_HLS/2020.2/common/technology/autopilot/ap_int_base.h</first>
<second>operator&amp;&lt;8, false, 8, false&gt;</second>
</first>
<second>1348</second>
</item>
</second>
</item>
</inlineStackInfo>
<originalName/>
<rtlName>and_ln1348_12_fu_547_p2</rtlName>
<control/>
<opType>and</opType>
<implIndex/>
<coreName/>
<coreId>1014263401</coreId>
</Obj>
<bitwidth>1</bitwidth>
</Value>
<oprand_edges>
<count>2</count>
<item_version>0</item_version>
<item>294</item>
<item>295</item>
</oprand_edges>
<opcode>and</opcode>
<m_Display>0</m_Display>
<m_isOnCriticalPath>0</m_isOnCriticalPath>
<m_isLCDNode>0</m_isLCDNode>
<m_isStartOfPath>0</m_isStartOfPath>
<m_delay>0.00</m_delay>
<m_topoIndex>80</m_topoIndex>
<m_clusterGroupNumber>3</m_clusterGroupNumber>
</item>
<item class_id_reference="9" object_id="_103">
<Value>
<Obj>
<type>0</type>
<id>111</id>
<name>and_ln1348_13</name>
<fileName>/tools/Xilinx/Vitis_HLS/2020.2/common/technology/autopilot/ap_int_base.h</fileName>
<fileDirectory>..</fileDirectory>
<lineNumber>1348</lineNumber>
<contextFuncName>operator&amp;&lt;8, false, 8, false&gt;</contextFuncName>
<contextNormFuncName>operator_8_false_8_false_s</contextNormFuncName>
<inlineStackInfo>
<count>1</count>
<item_version>0</item_version>
<item>
<first>/home/willychiang/Desktop/PYNQ-HelloWorld/boards/ip</first>
<second>
<count>1</count>
<item_version>0</item_version>
<item>
<first>
<first>/tools/Xilinx/Vitis_HLS/2020.2/common/technology/autopilot/ap_int_base.h</first>
<second>operator&amp;&lt;8, false, 8, false&gt;</second>
</first>
<second>1348</second>
</item>
</second>
</item>
</inlineStackInfo>
<originalName/>
<rtlName>and_ln1348_13_fu_553_p2</rtlName>
<control/>
<opType>and</opType>
<implIndex/>
<coreName/>
<coreId>132</coreId>
</Obj>
<bitwidth>1</bitwidth>
</Value>
<oprand_edges>
<count>2</count>
<item_version>0</item_version>
<item>296</item>
<item>297</item>
</oprand_edges>
<opcode>and</opcode>
<m_Display>0</m_Display>
<m_isOnCriticalPath>0</m_isOnCriticalPath>
<m_isLCDNode>0</m_isLCDNode>
<m_isStartOfPath>0</m_isStartOfPath>
<m_delay>0.00</m_delay>
<m_topoIndex>81</m_topoIndex>
<m_clusterGroupNumber>3</m_clusterGroupNumber>
</item>
<item class_id_reference="9" object_id="_104">
<Value>
<Obj>
<type>0</type>
<id>112</id>
<name>and_ln1348_14</name>
<fileName>/tools/Xilinx/Vitis_HLS/2020.2/common/technology/autopilot/ap_int_base.h</fileName>
<fileDirectory>..</fileDirectory>
<lineNumber>1348</lineNumber>
<contextFuncName>operator&amp;&lt;8, false, 8, false&gt;</contextFuncName>
<contextNormFuncName>operator_8_false_8_false_s</contextNormFuncName>
<inlineStackInfo>
<count>1</count>
<item_version>0</item_version>
<item>
<first>/home/willychiang/Desktop/PYNQ-HelloWorld/boards/ip</first>
<second>
<count>1</count>
<item_version>0</item_version>
<item>
<first>
<first>/tools/Xilinx/Vitis_HLS/2020.2/common/technology/autopilot/ap_int_base.h</first>
<second>operator&amp;&lt;8, false, 8, false&gt;</second>
</first>
<second>1348</second>
</item>
</second>
</item>
</inlineStackInfo>
<originalName/>
<rtlName>and_ln1348_14_fu_559_p2</rtlName>
<control/>
<opType>and</opType>
<implIndex/>
<coreName/>
<coreId>481</coreId>
</Obj>
<bitwidth>1</bitwidth>
</Value>
<oprand_edges>
<count>2</count>
<item_version>0</item_version>
<item>298</item>
<item>299</item>
</oprand_edges>
<opcode>and</opcode>
<m_Display>0</m_Display>
<m_isOnCriticalPath>0</m_isOnCriticalPath>
<m_isLCDNode>0</m_isLCDNode>
<m_isStartOfPath>0</m_isStartOfPath>
<m_delay>0.00</m_delay>
<m_topoIndex>82</m_topoIndex>
<m_clusterGroupNumber>3</m_clusterGroupNumber>
</item>
<item class_id_reference="9" object_id="_105">
<Value>
<Obj>
<type>0</type>
<id>113</id>
<name>and_ln1348_5</name>
<fileName>/tools/Xilinx/Vitis_HLS/2020.2/common/technology/autopilot/ap_int_base.h</fileName>
<fileDirectory>..</fileDirectory>
<lineNumber>1348</lineNumber>
<contextFuncName>operator&amp;&lt;8, false, 8, false&gt;</contextFuncName>
<contextNormFuncName>operator_8_false_8_false_s</contextNormFuncName>
<inlineStackInfo>
<count>1</count>
<item_version>0</item_version>
<item>
<first>/home/willychiang/Desktop/PYNQ-HelloWorld/boards/ip</first>
<second>
<count>1</count>
<item_version>0</item_version>
<item>
<first>
<first>/tools/Xilinx/Vitis_HLS/2020.2/common/technology/autopilot/ap_int_base.h</first>
<second>operator&amp;&lt;8, false, 8, false&gt;</second>
</first>
<second>1348</second>
</item>
</second>
</item>
</inlineStackInfo>
<originalName/>
<rtlName>and_ln1348_5_fu_565_p2</rtlName>
<control/>
<opType>and</opType>
<implIndex/>
<coreName/>
<coreId>1745</coreId>
</Obj>
<bitwidth>1</bitwidth>
</Value>
<oprand_edges>
<count>2</count>
<item_version>0</item_version>
<item>300</item>
<item>301</item>
</oprand_edges>
<opcode>and</opcode>
<m_Display>0</m_Display>
<m_isOnCriticalPath>0</m_isOnCriticalPath>
<m_isLCDNode>0</m_isLCDNode>
<m_isStartOfPath>0</m_isStartOfPath>
<m_delay>0.80</m_delay>
<m_topoIndex>83</m_topoIndex>
<m_clusterGroupNumber>3</m_clusterGroupNumber>
</item>
<item class_id_reference="9" object_id="_106">
<Value>
<Obj>
<type>0</type>
<id>114</id>
<name>or_ln1349</name>
<fileName>/tools/Xilinx/Vitis_HLS/2020.2/common/technology/autopilot/ap_int_base.h</fileName>
<fileDirectory>..</fileDirectory>
<lineNumber>1349</lineNumber>
<contextFuncName>operator|&lt;8, false, 8, false&gt;</contextFuncName>
<contextNormFuncName>operator_or_8_false_8_false</contextNormFuncName>
<inlineStackInfo>
<count>1</count>
<item_version>0</item_version>
<item>
<first>/home/willychiang/Desktop/PYNQ-HelloWorld/boards/ip</first>
<second>
<count>1</count>
<item_version>0</item_version>
<item>
<first>
<first>/tools/Xilinx/Vitis_HLS/2020.2/common/technology/autopilot/ap_int_base.h</first>
<second>operator|&lt;8, false, 8, false&gt;</second>
</first>
<second>1349</second>
</item>
</second>
</item>
</inlineStackInfo>
<originalName/>
<rtlName>or_ln1349_fu_571_p2</rtlName>
<control/>
<opType>or</opType>
<implIndex/>
<coreName/>
<coreId>3580030793</coreId>
</Obj>
<bitwidth>1</bitwidth>
</Value>
<oprand_edges>
<count>2</count>
<item_version>0</item_version>
<item>302</item>
<item>303</item>
</oprand_edges>
<opcode>or</opcode>
<m_Display>0</m_Display>
<m_isOnCriticalPath>0</m_isOnCriticalPath>
<m_isLCDNode>0</m_isLCDNode>
<m_isStartOfPath>0</m_isStartOfPath>
<m_delay>0.00</m_delay>
<m_topoIndex>84</m_topoIndex>
<m_clusterGroupNumber>4</m_clusterGroupNumber>
</item>
<item class_id_reference="9" object_id="_107">
<Value>
<Obj>
<type>0</type>
<id>115</id>
<name>or_ln1349_1</name>
<fileName>/tools/Xilinx/Vitis_HLS/2020.2/common/technology/autopilot/ap_int_base.h</fileName>
<fileDirectory>..</fileDirectory>
<lineNumber>1349</lineNumber>
<contextFuncName>operator|&lt;8, false, 8, false&gt;</contextFuncName>
<contextNormFuncName>operator_or_8_false_8_false</contextNormFuncName>
<inlineStackInfo>
<count>1</count>
<item_version>0</item_version>
<item>
<first>/home/willychiang/Desktop/PYNQ-HelloWorld/boards/ip</first>
<second>
<count>1</count>
<item_version>0</item_version>
<item>
<first>
<first>/tools/Xilinx/Vitis_HLS/2020.2/common/technology/autopilot/ap_int_base.h</first>
<second>operator|&lt;8, false, 8, false&gt;</second>
</first>
<second>1349</second>
</item>
</second>
</item>
</inlineStackInfo>
<originalName/>
<rtlName>or_ln1349_1_fu_575_p2</rtlName>
<control/>
<opType>or</opType>
<implIndex/>
<coreName/>
<coreId>1825</coreId>
</Obj>
<bitwidth>1</bitwidth>
</Value>
<oprand_edges>
<count>2</count>
<item_version>0</item_version>
<item>304</item>
<item>305</item>
</oprand_edges>
<opcode>or</opcode>
<m_Display>0</m_Display>
<m_isOnCriticalPath>0</m_isOnCriticalPath>
<m_isLCDNode>0</m_isLCDNode>
<m_isStartOfPath>0</m_isStartOfPath>
<m_delay>0.00</m_delay>
<m_topoIndex>85</m_topoIndex>
<m_clusterGroupNumber>4</m_clusterGroupNumber>
</item>
<item class_id_reference="9" object_id="_108">
<Value>
<Obj>
<type>0</type>
<id>116</id>
<name>select_ln174</name>
<fileName>/tools/Xilinx/Vitis_HLS/2020.2/common/technology/autopilot/hls_stream_39.h</fileName>
<fileDirectory>..</fileDirectory>
<lineNumber>174</lineNumber>
<contextFuncName>write</contextFuncName>
<contextNormFuncName>write</contextNormFuncName>
<inlineStackInfo>
<count>1</count>
<item_version>0</item_version>
<item>
<first>/home/willychiang/Desktop/PYNQ-HelloWorld/boards/ip</first>
<second>
<count>1</count>
<item_version>0</item_version>
<item>
<first>
<first>/tools/Xilinx/Vitis_HLS/2020.2/common/technology/autopilot/hls_stream_39.h</first>
<second>write</second>
</first>
<second>174</second>
</item>
</second>
</item>
</inlineStackInfo>
<originalName/>
<rtlName>imgHelper1_4101_din</rtlName>
<control>auto</control>
<opType>select</opType>
<implIndex>auto_sel</implIndex>
<coreName>Sel</coreName>
<coreId>73</coreId>
</Obj>
<bitwidth>8</bitwidth>
</Value>
<oprand_edges>
<count>3</count>
<item_version>0</item_version>
<item>306</item>
<item>308</item>
<item>310</item>
</oprand_edges>
<opcode>select</opcode>
<m_Display>0</m_Display>
<m_isOnCriticalPath>0</m_isOnCriticalPath>
<m_isLCDNode>0</m_isLCDNode>
<m_isStartOfPath>0</m_isStartOfPath>
<m_delay>0.81</m_delay>
<m_topoIndex>86</m_topoIndex>
<m_clusterGroupNumber>4</m_clusterGroupNumber>
</item>
<item class_id_reference="9" object_id="_109">
<Value>
<Obj>
<type>0</type>
<id>117</id>
<name>imgHelper1_4101_write_ln174</name>
<fileName>/tools/Xilinx/Vitis_HLS/2020.2/common/technology/autopilot/hls_stream_39.h</fileName>
<fileDirectory>..</fileDirectory>
<lineNumber>174</lineNumber>
<contextFuncName>write</contextFuncName>
<contextNormFuncName>write</contextNormFuncName>
<inlineStackInfo>
<count>1</count>
<item_version>0</item_version>
<item>
<first>/home/willychiang/Desktop/PYNQ-HelloWorld/boards/ip</first>
<second>
<count>1</count>
<item_version>0</item_version>
<item>
<first>
<first>/tools/Xilinx/Vitis_HLS/2020.2/common/technology/autopilot/hls_stream_39.h</first>
<second>write</second>
</first>
<second>174</second>
</item>
</second>
</item>
</inlineStackInfo>
<originalName/>
<rtlName/>
<control>auto</control>
<opType>fifo</opType>
<implIndex>srl</implIndex>
<coreName>FIFO_SRL</coreName>
<coreId>81</coreId>
</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>write</opcode>
<m_Display>0</m_Display>
<m_isOnCriticalPath>0</m_isOnCriticalPath>
<m_isLCDNode>0</m_isLCDNode>
<m_isStartOfPath>0</m_isStartOfPath>
<m_delay>3.40</m_delay>
<m_topoIndex>87</m_topoIndex>
<m_clusterGroupNumber>-1</m_clusterGroupNumber>
</item>
<item class_id_reference="9" object_id="_110">
<Value>
<Obj>
<type>0</type>
<id>118</id>
<name>br_ln0</name>
<fileName/>
<fileDirectory/>
<lineNumber>0</lineNumber>
<contextFuncName/>
<contextNormFuncName/>
<inlineStackInfo>
<count>0</count>
<item_version>0</item_version>
</inlineStackInfo>
<originalName/>
<rtlName/>
<control/>
<opType/>
<implIndex/>
<coreName/>
<coreId>4227859152</coreId>
</Obj>
<bitwidth>0</bitwidth>
</Value>
<oprand_edges>
<count>1</count>
<item_version>0</item_version>
<item>315</item>
</oprand_edges>
<opcode>br</opcode>
<m_Display>0</m_Display>
<m_isOnCriticalPath>0</m_isOnCriticalPath>
<m_isLCDNode>0</m_isLCDNode>
<m_isStartOfPath>0</m_isStartOfPath>
<m_delay>0.00</m_delay>
<m_topoIndex>88</m_topoIndex>
<m_clusterGroupNumber>-1</m_clusterGroupNumber>
</item>
<item class_id_reference="9" object_id="_111">
<Value>
<Obj>
<type>0</type>
<id>120</id>
<name>_ln155</name>
<fileName>/home/willychiang/Desktop/PYNQ-HelloWorld/boards/ip/vitis_lib/vision/L1/include/imgproc/xf_colorthresholding.hpp</fileName>
<fileDirectory>..</fileDirectory>
<lineNumber>155</lineNumber>
<contextFuncName>colorthresholding&lt;9, 0, 3, 2160, 3840, 1&gt;</contextFuncName>
<contextNormFuncName>colorthresholding_9_0_3_2160_3840_1_s</contextNormFuncName>
<inlineStackInfo>
<count>1</count>
<item_version>0</item_version>
<item>
<first>/home/willychiang/Desktop/PYNQ-HelloWorld/boards/ip</first>
<second>
<count>1</count>
<item_version>0</item_version>
<item>
<first>
<first>/home/willychiang/Desktop/PYNQ-HelloWorld/boards/ip/vitis_lib/vision/L1/include/imgproc/xf_colorthresholding.hpp</first>
<second>colorthresholding&lt;9, 0, 3, 2160, 3840, 1&gt;</second>
</first>
<second>155</second>
</item>
</second>
</item>
</inlineStackInfo>
<originalName/>
<rtlName/>
<control/>
<opType/>
<implIndex/>
<coreName/>
<coreId>0</coreId>
</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>
<m_isOnCriticalPath>0</m_isOnCriticalPath>
<m_isLCDNode>0</m_isLCDNode>
<m_isStartOfPath>0</m_isStartOfPath>
<m_delay>0.00</m_delay>
<m_topoIndex>89</m_topoIndex>
<m_clusterGroupNumber>-1</m_clusterGroupNumber>
</item>
</nodes>
<consts class_id="15" tracking_level="0" version="0">
<count>9</count>
<item_version>0</item_version>
<item class_id="16" tracking_level="1" version="0" object_id="_112">
<Value>
<Obj>
<type>2</type>
<id>169</id>
<name>empty</name>
<fileName/>
<fileDirectory/>
<lineNumber>0</lineNumber>
<contextFuncName/>
<contextNormFuncName/>
<inlineStackInfo>
<count>0</count>
<item_version>0</item_version>
</inlineStackInfo>
<originalName/>
<rtlName/>
<control/>
<opType/>
<implIndex/>
<coreName/>
<coreId>3579335216</coreId>
</Obj>
<bitwidth>32</bitwidth>
</Value>
<const_type>0</const_type>
<content>0</content>
</item>
<item class_id_reference="16" object_id="_113">
<Value>
<Obj>
<type>2</type>
<id>175</id>
<name>empty</name>
<fileName/>
<fileDirectory/>
<lineNumber>0</lineNumber>
<contextFuncName/>
<contextNormFuncName/>
<inlineStackInfo>
<count>0</count>
<item_version>0</item_version>
</inlineStackInfo>
<originalName/>
<rtlName/>
<control/>
<opType/>
<implIndex/>
<coreName/>
<coreId>3579994736</coreId>
</Obj>
<bitwidth>32</bitwidth>
</Value>
<const_type>0</const_type>
<content>1</content>
</item>
<item class_id_reference="16" object_id="_114">
<Value>
<Obj>
<type>2</type>
<id>189</id>
<name>empty</name>
<fileName/>
<fileDirectory/>
<lineNumber>0</lineNumber>
<contextFuncName/>
<contextNormFuncName/>
<inlineStackInfo>
<count>0</count>
<item_version>0</item_version>
</inlineStackInfo>
<originalName/>
<rtlName/>
<control/>
<opType/>
<implIndex/>
<coreName/>
<coreId>8</coreId>
</Obj>
<bitwidth>32</bitwidth>
</Value>
<const_type>0</const_type>
<content>8</content>
</item>
<item class_id_reference="16" object_id="_115">
<Value>
<Obj>
<type>2</type>
<id>191</id>
<name>empty</name>
<fileName/>
<fileDirectory/>
<lineNumber>0</lineNumber>
<contextFuncName/>
<contextNormFuncName/>
<inlineStackInfo>
<count>0</count>
<item_version>0</item_version>
</inlineStackInfo>
<originalName/>
<rtlName/>
<control/>
<opType/>
<implIndex/>
<coreName/>
<coreId>3579349936</coreId>
</Obj>
<bitwidth>32</bitwidth>
</Value>
<const_type>0</const_type>
<content>15</content>
</item>
<item class_id_reference="16" object_id="_116">
<Value>
<Obj>
<type>2</type>
<id>195</id>
<name>empty</name>
<fileName/>
<fileDirectory/>
<lineNumber>0</lineNumber>
<contextFuncName/>
<contextNormFuncName/>
<inlineStackInfo>
<count>0</count>
<item_version>0</item_version>
</inlineStackInfo>
<originalName/>
<rtlName/>
<control/>
<opType/>
<implIndex/>
<coreName/>
<coreId>49</coreId>
</Obj>
<bitwidth>32</bitwidth>
</Value>
<const_type>0</const_type>
<content>16</content>
</item>
<item class_id_reference="16" object_id="_117">
<Value>
<Obj>
<type>2</type>
<id>197</id>
<name>empty</name>
<fileName/>
<fileDirectory/>
<lineNumber>0</lineNumber>
<contextFuncName/>
<contextNormFuncName/>
<inlineStackInfo>
<count>0</count>
<item_version>0</item_version>
</inlineStackInfo>
<originalName/>
<rtlName/>
<control/>
<opType/>
<implIndex/>
<coreName/>
<coreId>0</coreId>
</Obj>
<bitwidth>32</bitwidth>
</Value>
<const_type>0</const_type>
<content>23</content>
</item>
<item class_id_reference="16" object_id="_118">
<Value>
<Obj>
<type>2</type>
<id>202</id>
<name>empty</name>
<fileName/>
<fileDirectory/>
<lineNumber>0</lineNumber>
<contextFuncName/>
<contextNormFuncName/>
<inlineStackInfo>
<count>0</count>
<item_version>0</item_version>
</inlineStackInfo>
<originalName/>
<rtlName/>
<control/>
<opType/>
<implIndex/>
<coreName/>
<coreId>3579622089</coreId>
</Obj>
<bitwidth>1</bitwidth>
</Value>
<const_type>0</const_type>
<content>1</content>
</item>
<item class_id_reference="16" object_id="_119">
<Value>
<Obj>
<type>2</type>
<id>307</id>
<name>empty</name>
<fileName/>
<fileDirectory/>
<lineNumber>0</lineNumber>
<contextFuncName/>
<contextNormFuncName/>
<inlineStackInfo>
<count>0</count>
<item_version>0</item_version>
</inlineStackInfo>
<originalName/>
<rtlName/>
<control/>
<opType/>
<implIndex/>
<coreName/>
<coreId>49</coreId>
</Obj>
<bitwidth>8</bitwidth>
</Value>
<const_type>0</const_type>
<content>255</content>
</item>
<item class_id_reference="16" object_id="_120">
<Value>
<Obj>
<type>2</type>
<id>309</id>
<name>empty</name>
<fileName/>
<fileDirectory/>
<lineNumber>0</lineNumber>
<contextFuncName/>
<contextNormFuncName/>
<inlineStackInfo>
<count>0</count>
<item_version>0</item_version>
</inlineStackInfo>
<originalName/>
<rtlName/>
<control/>
<opType/>
<implIndex/>
<coreName/>
<coreId>3579325417</coreId>
</Obj>
<bitwidth>8</bitwidth>
</Value>
<const_type>0</const_type>
<content>0</content>
</item>
</consts>
<blocks class_id="17" tracking_level="0" version="0">
<count>4</count>
<item_version>0</item_version>
<item class_id="18" tracking_level="1" version="0" object_id="_121">
<Obj>
<type>3</type>
<id>49</id>
<name>entry</name>
<fileName/>
<fileDirectory/>
<lineNumber>0</lineNumber>
<contextFuncName/>
<contextNormFuncName/>
<inlineStackInfo>
<count>0</count>
<item_version>0</item_version>
</inlineStackInfo>
<originalName/>
<rtlName/>
<control/>
<opType/>
<implIndex/>
<coreName/>
<coreId>1768189039</coreId>
</Obj>
<node_objs>
<count>24</count>
<item_version>0</item_version>
<item>23</item>
<item>24</item>
<item>25</item>
<item>26</item>
<item>27</item>
<item>28</item>
<item>29</item>
<item>30</item>
<item>31</item>
<item>32</item>
<item>33</item>
<item>34</item>
<item>35</item>
<item>36</item>
<item>37</item>
<item>38</item>
<item>39</item>
<item>40</item>
<item>41</item>
<item>42</item>
<item>45</item>
<item>46</item>
<item>47</item>
<item>48</item>
</node_objs>
</item>
<item class_id_reference="18" object_id="_122">
<Obj>
<type>3</type>
<id>54</id>
<name/>
<fileName/>
<fileDirectory/>
<lineNumber>0</lineNumber>
<contextFuncName/>
<contextNormFuncName/>
<inlineStackInfo>
<count>0</count>
<item_version>0</item_version>
</inlineStackInfo>
<originalName/>
<rtlName/>
<control/>
<opType/>
<implIndex/>
<coreName/>
<coreId>1768189039</coreId>
</Obj>
<node_objs>
<count>4</count>
<item_version>0</item_version>
<item>50</item>
<item>51</item>
<item>52</item>
<item>53</item>
</node_objs>
</item>
<item class_id_reference="18" object_id="_123">
<Obj>
<type>3</type>
<id>119</id>
<name>._crit_edge.loopexit.i</name>
<fileName/>
<fileDirectory/>
<lineNumber>0</lineNumber>
<contextFuncName/>
<contextNormFuncName/>
<inlineStackInfo>
<count>0</count>
<item_version>0</item_version>
</inlineStackInfo>
<originalName/>
<rtlName/>
<control/>
<opType/>
<implIndex/>
<coreName/>
<coreId>1768189039</coreId>
</Obj>
<node_objs>
<count>60</count>
<item_version>0</item_version>
<item>59</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>
<item>68</item>
<item>69</item>
<item>70</item>
<item>71</item>
<item>72</item>
<item>73</item>
<item>74</item>
<item>75</item>
<item>76</item>
<item>77</item>
<item>78</item>
<item>79</item>
<item>80</item>
<item>81</item>
<item>82</item>
<item>83</item>
<item>84</item>
<item>85</item>
<item>86</item>
<item>87</item>
<item>88</item>
<item>89</item>
<item>90</item>
<item>91</item>
<item>92</item>
<item>93</item>
<item>94</item>
<item>95</item>
<item>96</item>
<item>97</item>
<item>98</item>
<item>99</item>
<item>100</item>
<item>101</item>
<item>102</item>
<item>103</item>
<item>104</item>
<item>105</item>
<item>106</item>
<item>107</item>
<item>108</item>
<item>109</item>
<item>110</item>
<item>111</item>
<item>112</item>
<item>113</item>
<item>114</item>
<item>115</item>
<item>116</item>
<item>117</item>
<item>118</item>
</node_objs>
</item>
<item class_id_reference="18" object_id="_124">
<Obj>
<type>3</type>
<id>121</id>
<name>xFInRange<9, 0, 2160, 3840, 15, 0, 1, 9, 1, 3>.exit</name>
<fileName/>
<fileDirectory/>
<lineNumber>0</lineNumber>
<contextFuncName/>
<contextNormFuncName/>
<inlineStackInfo>
<count>0</count>
<item_version>0</item_version>
</inlineStackInfo>
<originalName/>
<rtlName/>
<control/>
<opType/>
<implIndex/>
<coreName/>
<coreId>4227858560</coreId>
</Obj>
<node_objs>
<count>1</count>
<item_version>0</item_version>
<item>120</item>
</node_objs>
</item>
</blocks>
<edges class_id="19" tracking_level="0" version="0">
<count>160</count>
<item_version>0</item_version>
<item class_id="20" tracking_level="1" version="0" object_id="_125">
<id>124</id>
<edge_type>1</edge_type>
<source_obj>22</source_obj>
<sink_obj>23</sink_obj>
<is_back_edge>0</is_back_edge>
</item>
<item class_id_reference="20" object_id="_126">
<id>126</id>
<edge_type>1</edge_type>
<source_obj>21</source_obj>
<sink_obj>24</sink_obj>
<is_back_edge>0</is_back_edge>
</item>
<item class_id_reference="20" object_id="_127">
<id>129</id>
<edge_type>1</edge_type>
<source_obj>20</source_obj>
<sink_obj>25</sink_obj>
<is_back_edge>0</is_back_edge>
</item>
<item class_id_reference="20" object_id="_128">
<id>131</id>
<edge_type>1</edge_type>
<source_obj>19</source_obj>
<sink_obj>26</sink_obj>
<is_back_edge>0</is_back_edge>
</item>
<item class_id_reference="20" object_id="_129">
<id>133</id>
<edge_type>1</edge_type>
<source_obj>18</source_obj>
<sink_obj>27</sink_obj>
<is_back_edge>0</is_back_edge>
</item>
<item class_id_reference="20" object_id="_130">
<id>135</id>
<edge_type>1</edge_type>
<source_obj>17</source_obj>
<sink_obj>28</sink_obj>
<is_back_edge>0</is_back_edge>
</item>
<item class_id_reference="20" object_id="_131">
<id>137</id>
<edge_type>1</edge_type>
<source_obj>16</source_obj>
<sink_obj>29</sink_obj>
<is_back_edge>0</is_back_edge>
</item>
<item class_id_reference="20" object_id="_132">
<id>139</id>
<edge_type>1</edge_type>
<source_obj>15</source_obj>
<sink_obj>30</sink_obj>
<is_back_edge>0</is_back_edge>
</item>
<item class_id_reference="20" object_id="_133">
<id>141</id>
<edge_type>1</edge_type>
<source_obj>14</source_obj>
<sink_obj>31</sink_obj>
<is_back_edge>0</is_back_edge>
</item>
<item class_id_reference="20" object_id="_134">
<id>143</id>
<edge_type>1</edge_type>
<source_obj>13</source_obj>
<sink_obj>32</sink_obj>
<is_back_edge>0</is_back_edge>
</item>
<item class_id_reference="20" object_id="_135">
<id>145</id>
<edge_type>1</edge_type>
<source_obj>12</source_obj>
<sink_obj>33</sink_obj>
<is_back_edge>0</is_back_edge>
</item>
<item class_id_reference="20" object_id="_136">
<id>147</id>
<edge_type>1</edge_type>
<source_obj>11</source_obj>
<sink_obj>34</sink_obj>
<is_back_edge>0</is_back_edge>
</item>
<item class_id_reference="20" object_id="_137">
<id>149</id>
<edge_type>1</edge_type>
<source_obj>10</source_obj>
<sink_obj>35</sink_obj>
<is_back_edge>0</is_back_edge>
</item>
<item class_id_reference="20" object_id="_138">
<id>151</id>
<edge_type>1</edge_type>
<source_obj>9</source_obj>
<sink_obj>36</sink_obj>
<is_back_edge>0</is_back_edge>
</item>
<item class_id_reference="20" object_id="_139">
<id>153</id>
<edge_type>1</edge_type>
<source_obj>8</source_obj>
<sink_obj>37</sink_obj>
<is_back_edge>0</is_back_edge>
</item>
<item class_id_reference="20" object_id="_140">
<id>155</id>
<edge_type>1</edge_type>
<source_obj>7</source_obj>
<sink_obj>38</sink_obj>
<is_back_edge>0</is_back_edge>
</item>
<item class_id_reference="20" object_id="_141">
<id>157</id>
<edge_type>1</edge_type>
<source_obj>6</source_obj>
<sink_obj>39</sink_obj>
<is_back_edge>0</is_back_edge>
</item>
<item class_id_reference="20" object_id="_142">
<id>159</id>
<edge_type>1</edge_type>
<source_obj>5</source_obj>
<sink_obj>40</sink_obj>
<is_back_edge>0</is_back_edge>
</item>
<item class_id_reference="20" object_id="_143">
<id>161</id>
<edge_type>1</edge_type>
<source_obj>4</source_obj>
<sink_obj>41</sink_obj>
<is_back_edge>0</is_back_edge>
</item>
<item class_id_reference="20" object_id="_144">
<id>163</id>
<edge_type>1</edge_type>
<source_obj>3</source_obj>
<sink_obj>42</sink_obj>
<is_back_edge>0</is_back_edge>
</item>
<item class_id_reference="20" object_id="_145">
<id>164</id>
<edge_type>1</edge_type>
<source_obj>24</source_obj>
<sink_obj>45</sink_obj>
<is_back_edge>0</is_back_edge>
</item>
<item class_id_reference="20" object_id="_146">
<id>165</id>
<edge_type>1</edge_type>
<source_obj>23</source_obj>
<sink_obj>46</sink_obj>
<is_back_edge>0</is_back_edge>
</item>
<item class_id_reference="20" object_id="_147">
<id>166</id>
<edge_type>1</edge_type>
<source_obj>45</source_obj>
<sink_obj>47</sink_obj>
<is_back_edge>0</is_back_edge>
</item>
<item class_id_reference="20" object_id="_148">
<id>167</id>
<edge_type>1</edge_type>
<source_obj>46</source_obj>
<sink_obj>47</sink_obj>
<is_back_edge>0</is_back_edge>
</item>
<item class_id_reference="20" object_id="_149">
<id>168</id>
<edge_type>2</edge_type>
<source_obj>54</source_obj>
<sink_obj>48</sink_obj>
<is_back_edge>0</is_back_edge>
</item>
<item class_id_reference="20" object_id="_150">
<id>170</id>
<edge_type>1</edge_type>
<source_obj>169</source_obj>
<sink_obj>50</sink_obj>
<is_back_edge>0</is_back_edge>
</item>
<item class_id_reference="20" object_id="_151">
<id>171</id>
<edge_type>2</edge_type>
<source_obj>49</source_obj>
<sink_obj>50</sink_obj>
<is_back_edge>0</is_back_edge>
</item>
<item class_id_reference="20" object_id="_152">
<id>172</id>
<edge_type>1</edge_type>
<source_obj>51</source_obj>
<sink_obj>50</sink_obj>
<is_back_edge>1</is_back_edge>
</item>
<item class_id_reference="20" object_id="_153">
<id>173</id>
<edge_type>2</edge_type>
<source_obj>119</source_obj>
<sink_obj>50</sink_obj>
<is_back_edge>1</is_back_edge>
</item>
<item class_id_reference="20" object_id="_154">
<id>174</id>
<edge_type>1</edge_type>
<source_obj>50</source_obj>
<sink_obj>51</sink_obj>
<is_back_edge>0</is_back_edge>
</item>
<item class_id_reference="20" object_id="_155">
<id>176</id>
<edge_type>1</edge_type>
<source_obj>175</source_obj>
<sink_obj>51</sink_obj>
<is_back_edge>0</is_back_edge>
</item>
<item class_id_reference="20" object_id="_156">
<id>177</id>
<edge_type>1</edge_type>
<source_obj>50</source_obj>
<sink_obj>52</sink_obj>
<is_back_edge>0</is_back_edge>
</item>
<item class_id_reference="20" object_id="_157">
<id>178</id>
<edge_type>1</edge_type>
<source_obj>47</source_obj>
<sink_obj>52</sink_obj>
<is_back_edge>0</is_back_edge>
</item>
<item class_id_reference="20" object_id="_158">
<id>179</id>
<edge_type>1</edge_type>
<source_obj>52</source_obj>
<sink_obj>53</sink_obj>
<is_back_edge>0</is_back_edge>
</item>
<item class_id_reference="20" object_id="_159">
<id>180</id>
<edge_type>2</edge_type>
<source_obj>119</source_obj>
<sink_obj>53</sink_obj>
<is_back_edge>0</is_back_edge>
</item>
<item class_id_reference="20" object_id="_160">
<id>181</id>
<edge_type>2</edge_type>
<source_obj>121</source_obj>
<sink_obj>53</sink_obj>
<is_back_edge>0</is_back_edge>
</item>
<item class_id_reference="20" object_id="_161">
<id>184</id>
<edge_type>1</edge_type>
<source_obj>1</source_obj>
<sink_obj>59</sink_obj>
<is_back_edge>0</is_back_edge>
</item>
<item class_id_reference="20" object_id="_162">
<id>185</id>
<edge_type>1</edge_type>
<source_obj>59</source_obj>
<sink_obj>60</sink_obj>
<is_back_edge>0</is_back_edge>
</item>
<item class_id_reference="20" object_id="_163">
<id>188</id>
<edge_type>1</edge_type>
<source_obj>59</source_obj>
<sink_obj>61</sink_obj>
<is_back_edge>0</is_back_edge>
</item>
<item class_id_reference="20" object_id="_164">
<id>190</id>
<edge_type>1</edge_type>
<source_obj>189</source_obj>
<sink_obj>61</sink_obj>
<is_back_edge>0</is_back_edge>
</item>
<item class_id_reference="20" object_id="_165">
<id>192</id>
<edge_type>1</edge_type>
<source_obj>191</source_obj>
<sink_obj>61</sink_obj>
<is_back_edge>0</is_back_edge>
</item>
<item class_id_reference="20" object_id="_166">
<id>194</id>
<edge_type>1</edge_type>
<source_obj>59</source_obj>
<sink_obj>62</sink_obj>
<is_back_edge>0</is_back_edge>
</item>
<item class_id_reference="20" object_id="_167">
<id>196</id>
<edge_type>1</edge_type>
<source_obj>195</source_obj>
<sink_obj>62</sink_obj>
<is_back_edge>0</is_back_edge>
</item>
<item class_id_reference="20" object_id="_168">
<id>198</id>
<edge_type>1</edge_type>
<source_obj>197</source_obj>
<sink_obj>62</sink_obj>
<is_back_edge>0</is_back_edge>
</item>
<item class_id_reference="20" object_id="_169">
<id>199</id>
<edge_type>1</edge_type>
<source_obj>60</source_obj>
<sink_obj>63</sink_obj>
<is_back_edge>0</is_back_edge>
</item>
<item class_id_reference="20" object_id="_170">
<id>200</id>
<edge_type>1</edge_type>
<source_obj>42</source_obj>
<sink_obj>63</sink_obj>
<is_back_edge>0</is_back_edge>
</item>
<item class_id_reference="20" object_id="_171">
<id>201</id>
<edge_type>1</edge_type>
<source_obj>63</source_obj>
<sink_obj>64</sink_obj>
<is_back_edge>0</is_back_edge>
</item>
<item class_id_reference="20" object_id="_172">
<id>203</id>
<edge_type>1</edge_type>
<source_obj>202</source_obj>
<sink_obj>64</sink_obj>
<is_back_edge>0</is_back_edge>
</item>
<item class_id_reference="20" object_id="_173">
<id>204</id>
<edge_type>1</edge_type>
<source_obj>33</source_obj>
<sink_obj>65</sink_obj>
<is_back_edge>0</is_back_edge>
</item>
<item class_id_reference="20" object_id="_174">
<id>205</id>
<edge_type>1</edge_type>
<source_obj>60</source_obj>
<sink_obj>65</sink_obj>
<is_back_edge>0</is_back_edge>
</item>
<item class_id_reference="20" object_id="_175">
<id>206</id>
<edge_type>1</edge_type>
<source_obj>65</source_obj>
<sink_obj>66</sink_obj>
<is_back_edge>0</is_back_edge>
</item>
<item class_id_reference="20" object_id="_176">
<id>207</id>
<edge_type>1</edge_type>
<source_obj>202</source_obj>
<sink_obj>66</sink_obj>
<is_back_edge>0</is_back_edge>
</item>
<item class_id_reference="20" object_id="_177">
<id>208</id>
<edge_type>1</edge_type>
<source_obj>32</source_obj>
<sink_obj>67</sink_obj>
<is_back_edge>0</is_back_edge>
</item>
<item class_id_reference="20" object_id="_178">
<id>209</id>
<edge_type>1</edge_type>
<source_obj>61</source_obj>
<sink_obj>67</sink_obj>
<is_back_edge>0</is_back_edge>
</item>
<item class_id_reference="20" object_id="_179">
<id>210</id>
<edge_type>1</edge_type>
<source_obj>67</source_obj>
<sink_obj>68</sink_obj>
<is_back_edge>0</is_back_edge>
</item>
<item class_id_reference="20" object_id="_180">
<id>211</id>
<edge_type>1</edge_type>
<source_obj>202</source_obj>
<sink_obj>68</sink_obj>
<is_back_edge>0</is_back_edge>
</item>
<item class_id_reference="20" object_id="_181">
<id>212</id>
<edge_type>1</edge_type>
<source_obj>61</source_obj>
<sink_obj>69</sink_obj>
<is_back_edge>0</is_back_edge>
</item>
<item class_id_reference="20" object_id="_182">
<id>213</id>
<edge_type>1</edge_type>
<source_obj>41</source_obj>
<sink_obj>69</sink_obj>
<is_back_edge>0</is_back_edge>
</item>
<item class_id_reference="20" object_id="_183">
<id>214</id>
<edge_type>1</edge_type>
<source_obj>69</source_obj>
<sink_obj>70</sink_obj>
<is_back_edge>0</is_back_edge>
</item>
<item class_id_reference="20" object_id="_184">
<id>215</id>
<edge_type>1</edge_type>
<source_obj>202</source_obj>
<sink_obj>70</sink_obj>
<is_back_edge>0</is_back_edge>
</item>
<item class_id_reference="20" object_id="_185">
<id>216</id>
<edge_type>1</edge_type>
<source_obj>31</source_obj>
<sink_obj>71</sink_obj>
<is_back_edge>0</is_back_edge>
</item>
<item class_id_reference="20" object_id="_186">
<id>217</id>
<edge_type>1</edge_type>
<source_obj>62</source_obj>
<sink_obj>71</sink_obj>
<is_back_edge>0</is_back_edge>
</item>
<item class_id_reference="20" object_id="_187">
<id>218</id>
<edge_type>1</edge_type>
<source_obj>71</source_obj>
<sink_obj>72</sink_obj>
<is_back_edge>0</is_back_edge>
</item>
<item class_id_reference="20" object_id="_188">
<id>219</id>
<edge_type>1</edge_type>
<source_obj>202</source_obj>
<sink_obj>72</sink_obj>
<is_back_edge>0</is_back_edge>
</item>
<item class_id_reference="20" object_id="_189">
<id>220</id>
<edge_type>1</edge_type>
<source_obj>62</source_obj>
<sink_obj>73</sink_obj>
<is_back_edge>0</is_back_edge>
</item>
<item class_id_reference="20" object_id="_190">
<id>221</id>
<edge_type>1</edge_type>
<source_obj>40</source_obj>
<sink_obj>73</sink_obj>
<is_back_edge>0</is_back_edge>
</item>
<item class_id_reference="20" object_id="_191">
<id>222</id>
<edge_type>1</edge_type>
<source_obj>73</source_obj>
<sink_obj>74</sink_obj>
<is_back_edge>0</is_back_edge>
</item>
<item class_id_reference="20" object_id="_192">
<id>223</id>
<edge_type>1</edge_type>
<source_obj>202</source_obj>
<sink_obj>74</sink_obj>
<is_back_edge>0</is_back_edge>
</item>
<item class_id_reference="20" object_id="_193">
<id>224</id>
<edge_type>1</edge_type>
<source_obj>70</source_obj>
<sink_obj>75</sink_obj>
<is_back_edge>0</is_back_edge>
</item>
<item class_id_reference="20" object_id="_194">
<id>225</id>
<edge_type>1</edge_type>
<source_obj>64</source_obj>
<sink_obj>75</sink_obj>
<is_back_edge>0</is_back_edge>
</item>
<item class_id_reference="20" object_id="_195">
<id>226</id>
<edge_type>1</edge_type>
<source_obj>75</source_obj>
<sink_obj>76</sink_obj>
<is_back_edge>0</is_back_edge>
</item>
<item class_id_reference="20" object_id="_196">
<id>227</id>
<edge_type>1</edge_type>
<source_obj>68</source_obj>
<sink_obj>76</sink_obj>
<is_back_edge>0</is_back_edge>
</item>
<item class_id_reference="20" object_id="_197">
<id>228</id>
<edge_type>1</edge_type>
<source_obj>74</source_obj>
<sink_obj>77</sink_obj>
<is_back_edge>0</is_back_edge>
</item>
<item class_id_reference="20" object_id="_198">
<id>229</id>
<edge_type>1</edge_type>
<source_obj>72</source_obj>
<sink_obj>77</sink_obj>
<is_back_edge>0</is_back_edge>
</item>
<item class_id_reference="20" object_id="_199">
<id>230</id>
<edge_type>1</edge_type>
<source_obj>77</source_obj>
<sink_obj>78</sink_obj>
<is_back_edge>0</is_back_edge>
</item>
<item class_id_reference="20" object_id="_200">
<id>231</id>
<edge_type>1</edge_type>
<source_obj>66</source_obj>
<sink_obj>78</sink_obj>
<is_back_edge>0</is_back_edge>
</item>
<item class_id_reference="20" object_id="_201">
<id>232</id>
<edge_type>1</edge_type>
<source_obj>78</source_obj>
<sink_obj>79</sink_obj>
<is_back_edge>0</is_back_edge>
</item>
<item class_id_reference="20" object_id="_202">
<id>233</id>
<edge_type>1</edge_type>
<source_obj>76</source_obj>
<sink_obj>79</sink_obj>
<is_back_edge>0</is_back_edge>
</item>
<item class_id_reference="20" object_id="_203">
<id>234</id>
<edge_type>1</edge_type>
<source_obj>60</source_obj>
<sink_obj>80</sink_obj>
<is_back_edge>0</is_back_edge>
</item>
<item class_id_reference="20" object_id="_204">
<id>235</id>
<edge_type>1</edge_type>
<source_obj>39</source_obj>
<sink_obj>80</sink_obj>
<is_back_edge>0</is_back_edge>
</item>
<item class_id_reference="20" object_id="_205">
<id>236</id>
<edge_type>1</edge_type>
<source_obj>80</source_obj>
<sink_obj>81</sink_obj>
<is_back_edge>0</is_back_edge>
</item>
<item class_id_reference="20" object_id="_206">
<id>237</id>
<edge_type>1</edge_type>
<source_obj>202</source_obj>
<sink_obj>81</sink_obj>
<is_back_edge>0</is_back_edge>
</item>
<item class_id_reference="20" object_id="_207">
<id>238</id>
<edge_type>1</edge_type>
<source_obj>30</source_obj>
<sink_obj>82</sink_obj>
<is_back_edge>0</is_back_edge>
</item>
<item class_id_reference="20" object_id="_208">
<id>239</id>
<edge_type>1</edge_type>
<source_obj>60</source_obj>
<sink_obj>82</sink_obj>
<is_back_edge>0</is_back_edge>
</item>
<item class_id_reference="20" object_id="_209">
<id>240</id>
<edge_type>1</edge_type>
<source_obj>82</source_obj>
<sink_obj>83</sink_obj>
<is_back_edge>0</is_back_edge>
</item>
<item class_id_reference="20" object_id="_210">
<id>241</id>
<edge_type>1</edge_type>
<source_obj>202</source_obj>
<sink_obj>83</sink_obj>
<is_back_edge>0</is_back_edge>
</item>
<item class_id_reference="20" object_id="_211">
<id>242</id>
<edge_type>1</edge_type>
<source_obj>29</source_obj>
<sink_obj>84</sink_obj>
<is_back_edge>0</is_back_edge>
</item>
<item class_id_reference="20" object_id="_212">
<id>243</id>
<edge_type>1</edge_type>
<source_obj>61</source_obj>
<sink_obj>84</sink_obj>
<is_back_edge>0</is_back_edge>
</item>
<item class_id_reference="20" object_id="_213">
<id>244</id>
<edge_type>1</edge_type>
<source_obj>84</source_obj>
<sink_obj>85</sink_obj>
<is_back_edge>0</is_back_edge>
</item>
<item class_id_reference="20" object_id="_214">
<id>245</id>
<edge_type>1</edge_type>
<source_obj>202</source_obj>
<sink_obj>85</sink_obj>
<is_back_edge>0</is_back_edge>
</item>
<item class_id_reference="20" object_id="_215">
<id>246</id>
<edge_type>1</edge_type>
<source_obj>61</source_obj>
<sink_obj>86</sink_obj>
<is_back_edge>0</is_back_edge>
</item>
<item class_id_reference="20" object_id="_216">
<id>247</id>
<edge_type>1</edge_type>
<source_obj>38</source_obj>
<sink_obj>86</sink_obj>
<is_back_edge>0</is_back_edge>
</item>
<item class_id_reference="20" object_id="_217">
<id>248</id>
<edge_type>1</edge_type>
<source_obj>86</source_obj>
<sink_obj>87</sink_obj>
<is_back_edge>0</is_back_edge>
</item>
<item class_id_reference="20" object_id="_218">
<id>249</id>
<edge_type>1</edge_type>
<source_obj>202</source_obj>
<sink_obj>87</sink_obj>
<is_back_edge>0</is_back_edge>
</item>
<item class_id_reference="20" object_id="_219">
<id>250</id>
<edge_type>1</edge_type>
<source_obj>28</source_obj>
<sink_obj>88</sink_obj>
<is_back_edge>0</is_back_edge>
</item>
<item class_id_reference="20" object_id="_220">
<id>251</id>
<edge_type>1</edge_type>
<source_obj>62</source_obj>
<sink_obj>88</sink_obj>
<is_back_edge>0</is_back_edge>
</item>
<item class_id_reference="20" object_id="_221">
<id>252</id>
<edge_type>1</edge_type>
<source_obj>88</source_obj>
<sink_obj>89</sink_obj>
<is_back_edge>0</is_back_edge>
</item>
<item class_id_reference="20" object_id="_222">
<id>253</id>
<edge_type>1</edge_type>
<source_obj>202</source_obj>
<sink_obj>89</sink_obj>
<is_back_edge>0</is_back_edge>
</item>
<item class_id_reference="20" object_id="_223">
<id>254</id>
<edge_type>1</edge_type>
<source_obj>62</source_obj>
<sink_obj>90</sink_obj>
<is_back_edge>0</is_back_edge>
</item>
<item class_id_reference="20" object_id="_224">
<id>255</id>
<edge_type>1</edge_type>
<source_obj>37</source_obj>
<sink_obj>90</sink_obj>
<is_back_edge>0</is_back_edge>
</item>
<item class_id_reference="20" object_id="_225">
<id>256</id>
<edge_type>1</edge_type>
<source_obj>90</source_obj>
<sink_obj>91</sink_obj>
<is_back_edge>0</is_back_edge>
</item>
<item class_id_reference="20" object_id="_226">
<id>257</id>
<edge_type>1</edge_type>
<source_obj>202</source_obj>
<sink_obj>91</sink_obj>
<is_back_edge>0</is_back_edge>
</item>
<item class_id_reference="20" object_id="_227">
<id>258</id>
<edge_type>1</edge_type>
<source_obj>87</source_obj>
<sink_obj>92</sink_obj>
<is_back_edge>0</is_back_edge>
</item>
<item class_id_reference="20" object_id="_228">
<id>259</id>
<edge_type>1</edge_type>
<source_obj>81</source_obj>
<sink_obj>92</sink_obj>
<is_back_edge>0</is_back_edge>
</item>
<item class_id_reference="20" object_id="_229">
<id>260</id>
<edge_type>1</edge_type>
<source_obj>92</source_obj>
<sink_obj>93</sink_obj>
<is_back_edge>0</is_back_edge>
</item>
<item class_id_reference="20" object_id="_230">
<id>261</id>
<edge_type>1</edge_type>
<source_obj>85</source_obj>
<sink_obj>93</sink_obj>
<is_back_edge>0</is_back_edge>
</item>
<item class_id_reference="20" object_id="_231">
<id>262</id>
<edge_type>1</edge_type>
<source_obj>91</source_obj>
<sink_obj>94</sink_obj>
<is_back_edge>0</is_back_edge>
</item>
<item class_id_reference="20" object_id="_232">
<id>263</id>
<edge_type>1</edge_type>
<source_obj>89</source_obj>
<sink_obj>94</sink_obj>
<is_back_edge>0</is_back_edge>
</item>
<item class_id_reference="20" object_id="_233">
<id>264</id>
<edge_type>1</edge_type>
<source_obj>94</source_obj>
<sink_obj>95</sink_obj>
<is_back_edge>0</is_back_edge>
</item>
<item class_id_reference="20" object_id="_234">
<id>265</id>
<edge_type>1</edge_type>
<source_obj>83</source_obj>
<sink_obj>95</sink_obj>
<is_back_edge>0</is_back_edge>
</item>
<item class_id_reference="20" object_id="_235">
<id>266</id>
<edge_type>1</edge_type>
<source_obj>95</source_obj>
<sink_obj>96</sink_obj>
<is_back_edge>0</is_back_edge>
</item>
<item class_id_reference="20" object_id="_236">
<id>267</id>
<edge_type>1</edge_type>
<source_obj>93</source_obj>
<sink_obj>96</sink_obj>
<is_back_edge>0</is_back_edge>
</item>
<item class_id_reference="20" object_id="_237">
<id>268</id>
<edge_type>1</edge_type>
<source_obj>60</source_obj>
<sink_obj>97</sink_obj>
<is_back_edge>0</is_back_edge>
</item>
<item class_id_reference="20" object_id="_238">
<id>269</id>
<edge_type>1</edge_type>
<source_obj>36</source_obj>
<sink_obj>97</sink_obj>
<is_back_edge>0</is_back_edge>
</item>
<item class_id_reference="20" object_id="_239">
<id>270</id>
<edge_type>1</edge_type>
<source_obj>97</source_obj>
<sink_obj>98</sink_obj>
<is_back_edge>0</is_back_edge>
</item>
<item class_id_reference="20" object_id="_240">
<id>271</id>
<edge_type>1</edge_type>
<source_obj>202</source_obj>
<sink_obj>98</sink_obj>
<is_back_edge>0</is_back_edge>
</item>
<item class_id_reference="20" object_id="_241">
<id>272</id>
<edge_type>1</edge_type>
<source_obj>27</source_obj>
<sink_obj>99</sink_obj>
<is_back_edge>0</is_back_edge>
</item>
<item class_id_reference="20" object_id="_242">
<id>273</id>
<edge_type>1</edge_type>
<source_obj>60</source_obj>
<sink_obj>99</sink_obj>
<is_back_edge>0</is_back_edge>
</item>
<item class_id_reference="20" object_id="_243">
<id>274</id>
<edge_type>1</edge_type>
<source_obj>99</source_obj>
<sink_obj>100</sink_obj>
<is_back_edge>0</is_back_edge>
</item>
<item class_id_reference="20" object_id="_244">
<id>275</id>
<edge_type>1</edge_type>
<source_obj>202</source_obj>
<sink_obj>100</sink_obj>
<is_back_edge>0</is_back_edge>
</item>
<item class_id_reference="20" object_id="_245">
<id>276</id>
<edge_type>1</edge_type>
<source_obj>26</source_obj>
<sink_obj>101</sink_obj>
<is_back_edge>0</is_back_edge>
</item>
<item class_id_reference="20" object_id="_246">
<id>277</id>
<edge_type>1</edge_type>
<source_obj>61</source_obj>
<sink_obj>101</sink_obj>
<is_back_edge>0</is_back_edge>
</item>
<item class_id_reference="20" object_id="_247">
<id>278</id>
<edge_type>1</edge_type>
<source_obj>101</source_obj>
<sink_obj>102</sink_obj>
<is_back_edge>0</is_back_edge>
</item>
<item class_id_reference="20" object_id="_248">
<id>279</id>
<edge_type>1</edge_type>
<source_obj>202</source_obj>
<sink_obj>102</sink_obj>
<is_back_edge>0</is_back_edge>
</item>
<item class_id_reference="20" object_id="_249">
<id>280</id>
<edge_type>1</edge_type>
<source_obj>61</source_obj>
<sink_obj>103</sink_obj>
<is_back_edge>0</is_back_edge>
</item>
<item class_id_reference="20" object_id="_250">
<id>281</id>
<edge_type>1</edge_type>
<source_obj>35</source_obj>
<sink_obj>103</sink_obj>
<is_back_edge>0</is_back_edge>
</item>
<item class_id_reference="20" object_id="_251">
<id>282</id>
<edge_type>1</edge_type>
<source_obj>103</source_obj>
<sink_obj>104</sink_obj>
<is_back_edge>0</is_back_edge>
</item>
<item class_id_reference="20" object_id="_252">
<id>283</id>
<edge_type>1</edge_type>
<source_obj>202</source_obj>
<sink_obj>104</sink_obj>
<is_back_edge>0</is_back_edge>
</item>
<item class_id_reference="20" object_id="_253">
<id>284</id>
<edge_type>1</edge_type>
<source_obj>25</source_obj>
<sink_obj>105</sink_obj>
<is_back_edge>0</is_back_edge>
</item>
<item class_id_reference="20" object_id="_254">
<id>285</id>
<edge_type>1</edge_type>
<source_obj>62</source_obj>
<sink_obj>105</sink_obj>
<is_back_edge>0</is_back_edge>
</item>
<item class_id_reference="20" object_id="_255">
<id>286</id>
<edge_type>1</edge_type>
<source_obj>105</source_obj>
<sink_obj>106</sink_obj>
<is_back_edge>0</is_back_edge>
</item>
<item class_id_reference="20" object_id="_256">
<id>287</id>
<edge_type>1</edge_type>
<source_obj>202</source_obj>
<sink_obj>106</sink_obj>
<is_back_edge>0</is_back_edge>
</item>
<item class_id_reference="20" object_id="_257">
<id>288</id>
<edge_type>1</edge_type>
<source_obj>62</source_obj>
<sink_obj>107</sink_obj>
<is_back_edge>0</is_back_edge>
</item>
<item class_id_reference="20" object_id="_258">
<id>289</id>
<edge_type>1</edge_type>
<source_obj>34</source_obj>
<sink_obj>107</sink_obj>
<is_back_edge>0</is_back_edge>
</item>
<item class_id_reference="20" object_id="_259">
<id>290</id>
<edge_type>1</edge_type>
<source_obj>107</source_obj>
<sink_obj>108</sink_obj>
<is_back_edge>0</is_back_edge>
</item>
<item class_id_reference="20" object_id="_260">
<id>291</id>
<edge_type>1</edge_type>
<source_obj>202</source_obj>
<sink_obj>108</sink_obj>
<is_back_edge>0</is_back_edge>
</item>
<item class_id_reference="20" object_id="_261">
<id>292</id>
<edge_type>1</edge_type>
<source_obj>104</source_obj>
<sink_obj>109</sink_obj>
<is_back_edge>0</is_back_edge>
</item>
<item class_id_reference="20" object_id="_262">
<id>293</id>
<edge_type>1</edge_type>
<source_obj>98</source_obj>
<sink_obj>109</sink_obj>
<is_back_edge>0</is_back_edge>
</item>
<item class_id_reference="20" object_id="_263">
<id>294</id>
<edge_type>1</edge_type>
<source_obj>109</source_obj>
<sink_obj>110</sink_obj>
<is_back_edge>0</is_back_edge>
</item>
<item class_id_reference="20" object_id="_264">
<id>295</id>
<edge_type>1</edge_type>
<source_obj>102</source_obj>
<sink_obj>110</sink_obj>
<is_back_edge>0</is_back_edge>
</item>
<item class_id_reference="20" object_id="_265">
<id>296</id>
<edge_type>1</edge_type>
<source_obj>108</source_obj>
<sink_obj>111</sink_obj>
<is_back_edge>0</is_back_edge>
</item>
<item class_id_reference="20" object_id="_266">
<id>297</id>
<edge_type>1</edge_type>
<source_obj>106</source_obj>
<sink_obj>111</sink_obj>
<is_back_edge>0</is_back_edge>
</item>
<item class_id_reference="20" object_id="_267">
<id>298</id>
<edge_type>1</edge_type>
<source_obj>111</source_obj>
<sink_obj>112</sink_obj>
<is_back_edge>0</is_back_edge>
</item>
<item class_id_reference="20" object_id="_268">
<id>299</id>
<edge_type>1</edge_type>
<source_obj>100</source_obj>
<sink_obj>112</sink_obj>
<is_back_edge>0</is_back_edge>
</item>
<item class_id_reference="20" object_id="_269">
<id>300</id>
<edge_type>1</edge_type>
<source_obj>112</source_obj>
<sink_obj>113</sink_obj>
<is_back_edge>0</is_back_edge>
</item>
<item class_id_reference="20" object_id="_270">
<id>301</id>
<edge_type>1</edge_type>
<source_obj>110</source_obj>
<sink_obj>113</sink_obj>
<is_back_edge>0</is_back_edge>
</item>
<item class_id_reference="20" object_id="_271">
<id>302</id>
<edge_type>1</edge_type>
<source_obj>79</source_obj>
<sink_obj>114</sink_obj>
<is_back_edge>0</is_back_edge>
</item>
<item class_id_reference="20" object_id="_272">
<id>303</id>
<edge_type>1</edge_type>
<source_obj>113</source_obj>
<sink_obj>114</sink_obj>
<is_back_edge>0</is_back_edge>
</item>
<item class_id_reference="20" object_id="_273">
<id>304</id>
<edge_type>1</edge_type>
<source_obj>114</source_obj>
<sink_obj>115</sink_obj>
<is_back_edge>0</is_back_edge>
</item>
<item class_id_reference="20" object_id="_274">
<id>305</id>
<edge_type>1</edge_type>
<source_obj>96</source_obj>
<sink_obj>115</sink_obj>
<is_back_edge>0</is_back_edge>
</item>
<item class_id_reference="20" object_id="_275">
<id>306</id>
<edge_type>1</edge_type>
<source_obj>115</source_obj>
<sink_obj>116</sink_obj>
<is_back_edge>0</is_back_edge>
</item>
<item class_id_reference="20" object_id="_276">
<id>308</id>
<edge_type>1</edge_type>
<source_obj>307</source_obj>
<sink_obj>116</sink_obj>
<is_back_edge>0</is_back_edge>
</item>
<item class_id_reference="20" object_id="_277">
<id>310</id>
<edge_type>1</edge_type>
<source_obj>309</source_obj>
<sink_obj>116</sink_obj>
<is_back_edge>0</is_back_edge>
</item>
<item class_id_reference="20" object_id="_278">
<id>313</id>
<edge_type>1</edge_type>
<source_obj>2</source_obj>
<sink_obj>117</sink_obj>
<is_back_edge>0</is_back_edge>
</item>
<item class_id_reference="20" object_id="_279">
<id>314</id>
<edge_type>1</edge_type>
<source_obj>116</source_obj>
<sink_obj>117</sink_obj>
<is_back_edge>0</is_back_edge>
</item>
<item class_id_reference="20" object_id="_280">
<id>315</id>
<edge_type>2</edge_type>
<source_obj>54</source_obj>
<sink_obj>118</sink_obj>
<is_back_edge>0</is_back_edge>
</item>
<item class_id_reference="20" object_id="_281">
<id>380</id>
<edge_type>2</edge_type>
<source_obj>49</source_obj>
<sink_obj>54</sink_obj>
<is_back_edge>0</is_back_edge>
</item>
<item class_id_reference="20" object_id="_282">
<id>381</id>
<edge_type>2</edge_type>
<source_obj>54</source_obj>
<sink_obj>121</sink_obj>
<is_back_edge>0</is_back_edge>
</item>
<item class_id_reference="20" object_id="_283">
<id>382</id>
<edge_type>2</edge_type>
<source_obj>54</source_obj>
<sink_obj>119</sink_obj>
<is_back_edge>0</is_back_edge>
</item>
<item class_id_reference="20" object_id="_284">
<id>383</id>
<edge_type>2</edge_type>
<source_obj>119</source_obj>
<sink_obj>54</sink_obj>
<is_back_edge>1</is_back_edge>
</item>
</edges>
</cdfg>
<cdfg_regions class_id="21" tracking_level="0" version="0">
<count>4</count>
<item_version>0</item_version>
<item class_id="22" tracking_level="1" version="0" object_id="_285">
<mId>1</mId>
<mTag>xFInRange<9, 0, 2160, 3840, 15, 0, 1, 9, 1, 3></mTag>
<mNormTag>xFInRange_9_0_2160_3840_15_0_1_9_1_3_s</mNormTag>
<mType>0</mType>
<sub_regions>
<count>3</count>
<item_version>0</item_version>
<item>2</item>
<item>3</item>
<item>4</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>5</mMinLatency>
<mMaxLatency>8294406</mMaxLatency>
<mIsDfPipe>0</mIsDfPipe>
<mDfPipe class_id="-1"/>
</item>
<item class_id_reference="22" object_id="_286">
<mId>2</mId>
<mTag>Entry</mTag>
<mNormTag>Entry</mNormTag>
<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>49</item>
</basic_blocks>
<mII>-1</mII>
<mDepth>-1</mDepth>
<mMinTripCount>-1</mMinTripCount>
<mMaxTripCount>-1</mMaxTripCount>
<mMinLatency>3</mMinLatency>
<mMaxLatency>3</mMaxLatency>
<mIsDfPipe>0</mIsDfPipe>
<mDfPipe class_id="-1"/>
</item>
<item class_id_reference="22" object_id="_287">
<mId>3</mId>
<mTag>VITIS_LOOP_92_1_VITIS_LOOP_96_2</mTag>
<mNormTag>VITIS_LOOP_92_1_VITIS_LOOP_96_2</mNormTag>
<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>54</item>
<item>119</item>
</basic_blocks>
<mII>1</mII>
<mDepth>3</mDepth>
<mMinTripCount>0</mMinTripCount>
<mMaxTripCount>8294400</mMaxTripCount>
<mMinLatency>0</mMinLatency>
<mMaxLatency>8294401</mMaxLatency>
<mIsDfPipe>0</mIsDfPipe>
<mDfPipe class_id="-1"/>
</item>
<item class_id_reference="22" object_id="_288">
<mId>4</mId>
<mTag>Return</mTag>
<mNormTag>Return</mNormTag>
<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>121</item>
</basic_blocks>
<mII>-1</mII>
<mDepth>-1</mDepth>
<mMinTripCount>-1</mMinTripCount>
<mMaxTripCount>-1</mMaxTripCount>
<mMinLatency>0</mMinLatency>
<mMaxLatency>0</mMaxLatency>
<mIsDfPipe>0</mIsDfPipe>
<mDfPipe class_id="-1"/>
</item>
</cdfg_regions>
<fsm class_id="24" tracking_level="1" version="0" object_id="_289">
<states class_id="25" tracking_level="0" version="0">
<count>8</count>
<item_version>0</item_version>
<item class_id="26" tracking_level="1" version="0" object_id="_290">
<id>1</id>
<operations class_id="27" tracking_level="0" version="0">
<count>5</count>
<item_version>0</item_version>
<item class_id="28" tracking_level="1" version="0" object_id="_291">
<id>23</id>
<stage>1</stage>
<latency>1</latency>
</item>
<item class_id_reference="28" object_id="_292">
<id>24</id>
<stage>1</stage>
<latency>1</latency>
</item>
<item class_id_reference="28" object_id="_293">
<id>45</id>
<stage>1</stage>
<latency>1</latency>
</item>
<item class_id_reference="28" object_id="_294">
<id>46</id>
<stage>1</stage>
<latency>1</latency>
</item>
<item class_id_reference="28" object_id="_295">
<id>47</id>
<stage>4</stage>
<latency>4</latency>
</item>
</operations>
</item>
<item class_id_reference="26" object_id="_296">
<id>2</id>
<operations>
<count>1</count>
<item_version>0</item_version>
<item class_id_reference="28" object_id="_297">
<id>47</id>
<stage>3</stage>
<latency>4</latency>
</item>
</operations>
</item>
<item class_id_reference="26" object_id="_298">
<id>3</id>
<operations>
<count>1</count>
<item_version>0</item_version>
<item class_id_reference="28" object_id="_299">
<id>47</id>
<stage>2</stage>
<latency>4</latency>
</item>
</operations>
</item>
<item class_id_reference="26" object_id="_300">
<id>4</id>
<operations>
<count>22</count>
<item_version>0</item_version>
<item class_id_reference="28" object_id="_301">
<id>25</id>
<stage>1</stage>
<latency>1</latency>
</item>
<item class_id_reference="28" object_id="_302">
<id>26</id>
<stage>1</stage>
<latency>1</latency>
</item>
<item class_id_reference="28" object_id="_303">
<id>27</id>
<stage>1</stage>
<latency>1</latency>
</item>
<item class_id_reference="28" object_id="_304">
<id>28</id>
<stage>1</stage>
<latency>1</latency>
</item>
<item class_id_reference="28" object_id="_305">
<id>29</id>
<stage>1</stage>
<latency>1</latency>
</item>
<item class_id_reference="28" object_id="_306">
<id>30</id>
<stage>1</stage>
<latency>1</latency>
</item>
<item class_id_reference="28" object_id="_307">
<id>31</id>
<stage>1</stage>
<latency>1</latency>
</item>
<item class_id_reference="28" object_id="_308">
<id>32</id>
<stage>1</stage>
<latency>1</latency>
</item>
<item class_id_reference="28" object_id="_309">
<id>33</id>
<stage>1</stage>
<latency>1</latency>
</item>
<item class_id_reference="28" object_id="_310">
<id>34</id>
<stage>1</stage>
<latency>1</latency>
</item>
<item class_id_reference="28" object_id="_311">
<id>35</id>
<stage>1</stage>
<latency>1</latency>
</item>
<item class_id_reference="28" object_id="_312">
<id>36</id>
<stage>1</stage>
<latency>1</latency>
</item>
<item class_id_reference="28" object_id="_313">
<id>37</id>
<stage>1</stage>
<latency>1</latency>
</item>
<item class_id_reference="28" object_id="_314">
<id>38</id>
<stage>1</stage>
<latency>1</latency>
</item>
<item class_id_reference="28" object_id="_315">
<id>39</id>
<stage>1</stage>
<latency>1</latency>
</item>
<item class_id_reference="28" object_id="_316">
<id>40</id>
<stage>1</stage>
<latency>1</latency>
</item>
<item class_id_reference="28" object_id="_317">
<id>41</id>
<stage>1</stage>
<latency>1</latency>
</item>
<item class_id_reference="28" object_id="_318">
<id>42</id>
<stage>1</stage>
<latency>1</latency>
</item>
<item class_id_reference="28" object_id="_319">
<id>43</id>
<stage>1</stage>
<latency>1</latency>
</item>
<item class_id_reference="28" object_id="_320">
<id>44</id>
<stage>1</stage>
<latency>1</latency>
</item>
<item class_id_reference="28" object_id="_321">
<id>47</id>
<stage>1</stage>
<latency>4</latency>
</item>
<item class_id_reference="28" object_id="_322">
<id>48</id>
<stage>1</stage>
<latency>1</latency>
</item>
</operations>
</item>
<item class_id_reference="26" object_id="_323">
<id>5</id>
<operations>
<count>4</count>
<item_version>0</item_version>
<item class_id_reference="28" object_id="_324">
<id>50</id>
<stage>1</stage>
<latency>1</latency>
</item>
<item class_id_reference="28" object_id="_325">
<id>51</id>
<stage>1</stage>
<latency>1</latency>
</item>
<item class_id_reference="28" object_id="_326">
<id>52</id>
<stage>1</stage>
<latency>1</latency>
</item>
<item class_id_reference="28" object_id="_327">
<id>53</id>
<stage>1</stage>
<latency>1</latency>
</item>
</operations>
</item>
<item class_id_reference="26" object_id="_328">
<id>6</id>
<operations>
<count>55</count>
<item_version>0</item_version>
<item class_id_reference="28" object_id="_329">
<id>59</id>
<stage>1</stage>
<latency>1</latency>
</item>
<item class_id_reference="28" object_id="_330">
<id>60</id>
<stage>1</stage>
<latency>1</latency>
</item>
<item class_id_reference="28" object_id="_331">
<id>61</id>
<stage>1</stage>
<latency>1</latency>
</item>
<item class_id_reference="28" object_id="_332">
<id>62</id>
<stage>1</stage>
<latency>1</latency>
</item>
<item class_id_reference="28" object_id="_333">
<id>63</id>
<stage>1</stage>
<latency>1</latency>
</item>
<item class_id_reference="28" object_id="_334">
<id>64</id>
<stage>1</stage>
<latency>1</latency>
</item>
<item class_id_reference="28" object_id="_335">
<id>65</id>
<stage>1</stage>
<latency>1</latency>
</item>
<item class_id_reference="28" object_id="_336">
<id>66</id>
<stage>1</stage>
<latency>1</latency>
</item>
<item class_id_reference="28" object_id="_337">
<id>67</id>
<stage>1</stage>
<latency>1</latency>
</item>
<item class_id_reference="28" object_id="_338">
<id>68</id>
<stage>1</stage>
<latency>1</latency>
</item>
<item class_id_reference="28" object_id="_339">
<id>69</id>
<stage>1</stage>
<latency>1</latency>
</item>
<item class_id_reference="28" object_id="_340">
<id>70</id>
<stage>1</stage>
<latency>1</latency>
</item>
<item class_id_reference="28" object_id="_341">
<id>71</id>
<stage>1</stage>
<latency>1</latency>
</item>
<item class_id_reference="28" object_id="_342">
<id>72</id>
<stage>1</stage>
<latency>1</latency>
</item>
<item class_id_reference="28" object_id="_343">
<id>73</id>
<stage>1</stage>
<latency>1</latency>
</item>
<item class_id_reference="28" object_id="_344">
<id>74</id>
<stage>1</stage>
<latency>1</latency>
</item>
<item class_id_reference="28" object_id="_345">
<id>75</id>
<stage>1</stage>
<latency>1</latency>
</item>
<item class_id_reference="28" object_id="_346">
<id>76</id>
<stage>1</stage>
<latency>1</latency>
</item>
<item class_id_reference="28" object_id="_347">
<id>77</id>
<stage>1</stage>
<latency>1</latency>
</item>
<item class_id_reference="28" object_id="_348">
<id>78</id>
<stage>1</stage>
<latency>1</latency>
</item>
<item class_id_reference="28" object_id="_349">
<id>79</id>
<stage>1</stage>
<latency>1</latency>
</item>
<item class_id_reference="28" object_id="_350">
<id>80</id>
<stage>1</stage>
<latency>1</latency>
</item>
<item class_id_reference="28" object_id="_351">
<id>81</id>
<stage>1</stage>
<latency>1</latency>
</item>
<item class_id_reference="28" object_id="_352">
<id>82</id>
<stage>1</stage>
<latency>1</latency>
</item>
<item class_id_reference="28" object_id="_353">
<id>83</id>
<stage>1</stage>
<latency>1</latency>
</item>
<item class_id_reference="28" object_id="_354">
<id>84</id>
<stage>1</stage>
<latency>1</latency>
</item>
<item class_id_reference="28" object_id="_355">
<id>85</id>
<stage>1</stage>
<latency>1</latency>
</item>
<item class_id_reference="28" object_id="_356">
<id>86</id>
<stage>1</stage>
<latency>1</latency>
</item>
<item class_id_reference="28" object_id="_357">
<id>87</id>
<stage>1</stage>
<latency>1</latency>
</item>
<item class_id_reference="28" object_id="_358">
<id>88</id>
<stage>1</stage>
<latency>1</latency>
</item>
<item class_id_reference="28" object_id="_359">
<id>89</id>
<stage>1</stage>
<latency>1</latency>
</item>
<item class_id_reference="28" object_id="_360">
<id>90</id>
<stage>1</stage>
<latency>1</latency>
</item>
<item class_id_reference="28" object_id="_361">
<id>91</id>
<stage>1</stage>
<latency>1</latency>
</item>
<item class_id_reference="28" object_id="_362">
<id>92</id>
<stage>1</stage>
<latency>1</latency>
</item>
<item class_id_reference="28" object_id="_363">
<id>93</id>
<stage>1</stage>
<latency>1</latency>
</item>
<item class_id_reference="28" object_id="_364">
<id>94</id>
<stage>1</stage>
<latency>1</latency>
</item>
<item class_id_reference="28" object_id="_365">
<id>95</id>
<stage>1</stage>
<latency>1</latency>
</item>
<item class_id_reference="28" object_id="_366">
<id>96</id>
<stage>1</stage>
<latency>1</latency>
</item>
<item class_id_reference="28" object_id="_367">
<id>97</id>
<stage>1</stage>
<latency>1</latency>
</item>
<item class_id_reference="28" object_id="_368">
<id>98</id>
<stage>1</stage>
<latency>1</latency>
</item>
<item class_id_reference="28" object_id="_369">
<id>99</id>
<stage>1</stage>
<latency>1</latency>
</item>
<item class_id_reference="28" object_id="_370">
<id>100</id>
<stage>1</stage>
<latency>1</latency>
</item>
<item class_id_reference="28" object_id="_371">
<id>101</id>
<stage>1</stage>
<latency>1</latency>
</item>
<item class_id_reference="28" object_id="_372">
<id>102</id>
<stage>1</stage>
<latency>1</latency>
</item>
<item class_id_reference="28" object_id="_373">
<id>103</id>
<stage>1</stage>
<latency>1</latency>
</item>
<item class_id_reference="28" object_id="_374">
<id>104</id>
<stage>1</stage>
<latency>1</latency>
</item>
<item class_id_reference="28" object_id="_375">
<id>105</id>
<stage>1</stage>
<latency>1</latency>
</item>
<item class_id_reference="28" object_id="_376">
<id>106</id>
<stage>1</stage>
<latency>1</latency>
</item>
<item class_id_reference="28" object_id="_377">
<id>107</id>
<stage>1</stage>
<latency>1</latency>
</item>
<item class_id_reference="28" object_id="_378">
<id>108</id>
<stage>1</stage>
<latency>1</latency>
</item>
<item class_id_reference="28" object_id="_379">
<id>109</id>
<stage>1</stage>
<latency>1</latency>
</item>
<item class_id_reference="28" object_id="_380">
<id>110</id>
<stage>1</stage>
<latency>1</latency>
</item>
<item class_id_reference="28" object_id="_381">
<id>111</id>
<stage>1</stage>
<latency>1</latency>
</item>
<item class_id_reference="28" object_id="_382">
<id>112</id>
<stage>1</stage>
<latency>1</latency>
</item>
<item class_id_reference="28" object_id="_383">
<id>113</id>
<stage>1</stage>
<latency>1</latency>
</item>
</operations>
</item>
<item class_id_reference="26" object_id="_384">
<id>7</id>
<operations>
<count>9</count>
<item_version>0</item_version>
<item class_id_reference="28" object_id="_385">
<id>55</id>
<stage>1</stage>
<latency>1</latency>
</item>
<item class_id_reference="28" object_id="_386">
<id>56</id>
<stage>1</stage>
<latency>1</latency>
</item>
<item class_id_reference="28" object_id="_387">
<id>57</id>
<stage>1</stage>
<latency>1</latency>
</item>
<item class_id_reference="28" object_id="_388">
<id>58</id>
<stage>1</stage>
<latency>1</latency>
</item>
<item class_id_reference="28" object_id="_389">
<id>114</id>
<stage>1</stage>
<latency>1</latency>
</item>
<item class_id_reference="28" object_id="_390">
<id>115</id>
<stage>1</stage>
<latency>1</latency>
</item>
<item class_id_reference="28" object_id="_391">
<id>116</id>
<stage>1</stage>
<latency>1</latency>
</item>
<item class_id_reference="28" object_id="_392">
<id>117</id>
<stage>1</stage>
<latency>1</latency>
</item>
<item class_id_reference="28" object_id="_393">
<id>118</id>
<stage>1</stage>
<latency>1</latency>
</item>
</operations>
</item>
<item class_id_reference="26" object_id="_394">
<id>8</id>
<operations>
<count>1</count>
<item_version>0</item_version>
<item class_id_reference="28" object_id="_395">
<id>120</id>
<stage>1</stage>
<latency>1</latency>
</item>
</operations>
</item>
</states>
<transitions class_id="29" tracking_level="0" version="0">
<count>8</count>
<item_version>0</item_version>
<item class_id="30" tracking_level="1" version="0" object_id="_396">
<inState>1</inState>
<outState>2</outState>
<condition class_id="31" tracking_level="0" version="0">
<id>-1</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="_397">
<inState>2</inState>
<outState>3</outState>
<condition>
<id>-1</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="_398">
<inState>3</inState>
<outState>4</outState>
<condition>
<id>-1</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="_399">
<inState>4</inState>
<outState>5</outState>
<condition>
<id>-1</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="_400">
<inState>6</inState>
<outState>7</outState>
<condition>
<id>-1</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="_401">
<inState>7</inState>
<outState>5</outState>
<condition>
<id>-1</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="_402">
<inState>5</inState>
<outState>8</outState>
<condition>
<id>-1</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>52</first>
<second>0</second>
</first>
<second>0</second>
</item>
</item>
</sop>
</condition>
</item>
<item class_id_reference="30" object_id="_403">
<inState>5</inState>
<outState>6</outState>
<condition>
<id>-1</id>
<sop>
<count>1</count>
<item_version>0</item_version>
<item>
<count>1</count>
<item_version>0</item_version>
<item>
<first>
<first>52</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="_404">
<dp_component_resource class_id="37" tracking_level="0" version="0">
<count>0</count>
<item_version>0</item_version>
</dp_component_resource>
<dp_expression_resource>
<count>62</count>
<item_version>0</item_version>
<item class_id="38" tracking_level="0" version="0">
<first>add_ln92_fu_248_p2 ( + ) </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>(0P0)</first>
<second>32</second>
</item>
<item>
<first>(1P1)</first>
<second>1</second>
</item>
<item>
<first>FF</first>
<second>0</second>
</item>
<item>
<first>LUT</first>
<second>32</second>
</item>
</second>
</item>
<item>
<first>and_ln1348_10_fu_463_p2 ( and ) </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>1</second>
</item>
</second>
</item>
<item>
<first>and_ln1348_11_fu_541_p2 ( and ) </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>1</second>
</item>
</second>
</item>
<item>
<first>and_ln1348_12_fu_547_p2 ( and ) </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>1</second>
</item>
</second>
</item>
<item>
<first>and_ln1348_13_fu_553_p2 ( and ) </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>1</second>
</item>
</second>
</item>
<item>
<first>and_ln1348_14_fu_559_p2 ( and ) </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>1</second>
</item>
</second>
</item>
<item>
<first>and_ln1348_1_fu_373_p2 ( and ) </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>1</second>
</item>
</second>
</item>
<item>
<first>and_ln1348_2_fu_355_p2 ( and ) </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>1</second>
</item>
</second>
</item>
<item>
<first>and_ln1348_3_fu_469_p2 ( and ) </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>1</second>
</item>
</second>
</item>
<item>
<first>and_ln1348_4_fu_361_p2 ( and ) </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>1</second>
</item>
</second>
</item>
<item>
<first>and_ln1348_5_fu_565_p2 ( and ) </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>1</second>
</item>
</second>
</item>
<item>
<first>and_ln1348_6_fu_367_p2 ( and ) </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>1</second>
</item>
</second>
</item>
<item>
<first>and_ln1348_7_fu_445_p2 ( and ) </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>1</second>
</item>
</second>
</item>
<item>
<first>and_ln1348_8_fu_451_p2 ( and ) </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>1</second>
</item>
</second>
</item>
<item>
<first>and_ln1348_9_fu_457_p2 ( and ) </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>1</second>
</item>
</second>
</item>
<item>
<first>and_ln1348_fu_349_p2 ( and ) </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>1</second>
</item>
</second>
</item>
<item>
<first>ap_block_pp0_stage0_01001 ( 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>1</second>
</item>
</second>
</item>
<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>1</second>
</item>
</second>
</item>
<item>
<first>ap_block_state6_pp0_stage0_iter1 ( and ) </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>1</second>
</item>
</second>
</item>
<item>
<first>ap_block_state7_pp0_stage0_iter2 ( and ) </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>1</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_reg_pp0_iter1 ( xor ) </first>
<second>
<count>4</count>
<item_version>0</item_version>
<item>
<first>(0P0)</first>
<second>2</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>icmp_ln56_10_fu_508_p2 ( icmp ) </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>4</second>
</item>
</second>
</item>
<item>
<first>icmp_ln56_11_fu_530_p2 ( icmp ) </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>4</second>
</item>
</second>
</item>
<item>
<first>icmp_ln56_1_fu_294_p2 ( icmp ) </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>4</second>
</item>
</second>
</item>
<item>
<first>icmp_ln56_2_fu_316_p2 ( icmp ) </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>4</second>
</item>
</second>
</item>
<item>
<first>icmp_ln56_3_fu_338_p2 ( icmp ) </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>4</second>
</item>
</second>
</item>
<item>
<first>icmp_ln56_4_fu_379_p2 ( icmp ) </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>4</second>
</item>
</second>
</item>
<item>
<first>icmp_ln56_5_fu_390_p2 ( icmp ) </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>4</second>
</item>
</second>
</item>
<item>
<first>icmp_ln56_6_fu_412_p2 ( icmp ) </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>4</second>
</item>
</second>
</item>
<item>
<first>icmp_ln56_7_fu_434_p2 ( icmp ) </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>4</second>
</item>
</second>
</item>
<item>
<first>icmp_ln56_8_fu_475_p2 ( icmp ) </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>4</second>
</item>
</second>
</item>
<item>
<first>icmp_ln56_9_fu_486_p2 ( icmp ) </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>4</second>
</item>
</second>
</item>
<item>
<first>icmp_ln56_fu_283_p2 ( icmp ) </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>4</second>
</item>
</second>
</item>
<item>
<first>icmp_ln890_1_fu_327_p2 ( icmp ) </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>4</second>
</item>
</second>
</item>
<item>
<first>icmp_ln890_2_fu_401_p2 ( icmp ) </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>4</second>
</item>
</second>
</item>
<item>
<first>icmp_ln890_3_fu_423_p2 ( icmp ) </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>4</second>
</item>
</second>
</item>
<item>
<first>icmp_ln890_4_fu_497_p2 ( icmp ) </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>4</second>
</item>
</second>
</item>
<item>
<first>icmp_ln890_5_fu_519_p2 ( icmp ) </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>4</second>
</item>
</second>
</item>
<item>
<first>icmp_ln890_fu_305_p2 ( icmp ) </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>4</second>
</item>
</second>
</item>
<item>
<first>icmp_ln92_fu_254_p2 ( icmp ) </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>12</second>
</item>
</second>
</item>
<item>
<first>imgHelper1_4101_din ( select ) </first>
<second>
<count>5</count>
<item_version>0</item_version>
<item>
<first>(0P0)</first>
<second>1</second>
</item>
<item>
<first>(1P1)</first>
<second>2</second>
</item>
<item>
<first>(2P2)</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>or_ln1349_1_fu_575_p2 ( 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>1</second>
</item>
</second>
</item>
<item>
<first>or_ln1349_fu_571_p2 ( 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>1</second>
</item>
</second>
</item>
<item>
<first>xor_ln56_10_fu_513_p2 ( 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>xor_ln56_11_fu_535_p2 ( 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>xor_ln56_1_fu_299_p2 ( 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>xor_ln56_2_fu_321_p2 ( 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>xor_ln56_3_fu_343_p2 ( 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>xor_ln56_4_fu_384_p2 ( 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>xor_ln56_5_fu_395_p2 ( 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>xor_ln56_6_fu_417_p2 ( 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>xor_ln56_7_fu_439_p2 ( 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>xor_ln56_8_fu_480_p2 ( 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>xor_ln56_9_fu_491_p2 ( 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>xor_ln56_fu_288_p2 ( 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>xor_ln890_1_fu_332_p2 ( 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>xor_ln890_2_fu_406_p2 ( 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>xor_ln890_3_fu_428_p2 ( 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>xor_ln890_4_fu_502_p2 ( 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>xor_ln890_5_fu_524_p2 ( 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>xor_ln890_fu_310_p2 ( 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>
</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>7</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>7</second>
</item>
<item>
<first>(1Bits)</first>
<second>1</second>
</item>
<item>
<first>(2Count)</first>
<second>7</second>
</item>
<item>
<first>LUT</first>
<second>29</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>imgHelper1_4101_blk_n</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_flatten_reg_229</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>9</second>
</item>
</second>
</item>
<item>
<first>rgb2hsv_4100_blk_n</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>12</count>
<item_version>0</item_version>
<item>
<first>and_ln1348_1_reg_709</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>and_ln1348_3_reg_714</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>and_ln1348_5_reg_719</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_CS_fsm</first>
<second>
<count>3</count>
<item_version>0</item_version>
<item>
<first>(Bits)</first>
<second>6</second>
</item>
<item>
<first>(Consts)</first>
<second>0</second>
</item>
<item>
<first>FF</first>
<second>6</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>bound_reg_695</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>icmp_ln92_reg_705</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>icmp_ln92_reg_705_pp0_iter1_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>indvar_flatten_reg_229</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_dsp_resource>
<count>1</count>
<item_version>0</item_version>
<item>
<first>mul_mul_16ns_16ns_32_4_1_U57</first>
<second>
<count>1</count>
<item_version>0</item_version>
<item>
<first>DSP</first>
<second>1</second>
</item>
</second>
</item>
</dp_dsp_resource>
<dp_component_map class_id="41" tracking_level="0" version="0">
<count>0</count>
<item_version>0</item_version>
</dp_component_map>
<dp_expression_map>
<count>56</count>
<item_version>0</item_version>
<item class_id="42" tracking_level="0" version="0">
<first>add_ln92_fu_248_p2 ( + ) </first>
<second>
<count>1</count>
<item_version>0</item_version>
<item>51</item>
</second>
</item>
<item>
<first>and_ln1348_10_fu_463_p2 ( and ) </first>
<second>
<count>1</count>
<item_version>0</item_version>
<item>95</item>
</second>
</item>
<item>
<first>and_ln1348_11_fu_541_p2 ( and ) </first>
<second>
<count>1</count>
<item_version>0</item_version>
<item>109</item>
</second>
</item>
<item>
<first>and_ln1348_12_fu_547_p2 ( and ) </first>
<second>
<count>1</count>
<item_version>0</item_version>
<item>110</item>
</second>
</item>
<item>
<first>and_ln1348_13_fu_553_p2 ( and ) </first>
<second>
<count>1</count>
<item_version>0</item_version>
<item>111</item>
</second>
</item>
<item>
<first>and_ln1348_14_fu_559_p2 ( and ) </first>
<second>
<count>1</count>
<item_version>0</item_version>
<item>112</item>
</second>
</item>
<item>
<first>and_ln1348_1_fu_373_p2 ( and ) </first>
<second>
<count>1</count>
<item_version>0</item_version>
<item>79</item>
</second>
</item>
<item>
<first>and_ln1348_2_fu_355_p2 ( and ) </first>
<second>
<count>1</count>
<item_version>0</item_version>
<item>76</item>
</second>
</item>
<item>
<first>and_ln1348_3_fu_469_p2 ( and ) </first>
<second>
<count>1</count>
<item_version>0</item_version>
<item>96</item>
</second>
</item>
<item>
<first>and_ln1348_4_fu_361_p2 ( and ) </first>
<second>
<count>1</count>
<item_version>0</item_version>
<item>77</item>
</second>
</item>
<item>
<first>and_ln1348_5_fu_565_p2 ( and ) </first>
<second>
<count>1</count>
<item_version>0</item_version>
<item>113</item>
</second>
</item>
<item>
<first>and_ln1348_6_fu_367_p2 ( and ) </first>
<second>
<count>1</count>
<item_version>0</item_version>
<item>78</item>
</second>
</item>
<item>
<first>and_ln1348_7_fu_445_p2 ( and ) </first>
<second>
<count>1</count>
<item_version>0</item_version>
<item>92</item>
</second>
</item>
<item>
<first>and_ln1348_8_fu_451_p2 ( and ) </first>
<second>
<count>1</count>
<item_version>0</item_version>
<item>93</item>
</second>
</item>
<item>
<first>and_ln1348_9_fu_457_p2 ( and ) </first>
<second>
<count>1</count>
<item_version>0</item_version>
<item>94</item>
</second>
</item>
<item>
<first>and_ln1348_fu_349_p2 ( and ) </first>
<second>
<count>1</count>
<item_version>0</item_version>
<item>75</item>
</second>
</item>
<item>
<first>icmp_ln56_10_fu_508_p2 ( icmp ) </first>
<second>
<count>1</count>
<item_version>0</item_version>
<item>103</item>
</second>
</item>
<item>
<first>icmp_ln56_11_fu_530_p2 ( icmp ) </first>
<second>
<count>1</count>
<item_version>0</item_version>
<item>107</item>
</second>
</item>
<item>
<first>icmp_ln56_1_fu_294_p2 ( icmp ) </first>
<second>
<count>1</count>
<item_version>0</item_version>
<item>65</item>
</second>
</item>
<item>
<first>icmp_ln56_2_fu_316_p2 ( icmp ) </first>
<second>
<count>1</count>
<item_version>0</item_version>
<item>69</item>
</second>
</item>
<item>
<first>icmp_ln56_3_fu_338_p2 ( icmp ) </first>
<second>
<count>1</count>
<item_version>0</item_version>
<item>73</item>
</second>
</item>
<item>
<first>icmp_ln56_4_fu_379_p2 ( icmp ) </first>
<second>
<count>1</count>
<item_version>0</item_version>
<item>80</item>
</second>
</item>
<item>
<first>icmp_ln56_5_fu_390_p2 ( icmp ) </first>
<second>
<count>1</count>
<item_version>0</item_version>
<item>82</item>
</second>
</item>
<item>
<first>icmp_ln56_6_fu_412_p2 ( icmp ) </first>
<second>
<count>1</count>
<item_version>0</item_version>
<item>86</item>
</second>
</item>
<item>
<first>icmp_ln56_7_fu_434_p2 ( icmp ) </first>
<second>
<count>1</count>
<item_version>0</item_version>
<item>90</item>
</second>
</item>
<item>
<first>icmp_ln56_8_fu_475_p2 ( icmp ) </first>
<second>
<count>1</count>
<item_version>0</item_version>
<item>97</item>
</second>
</item>
<item>
<first>icmp_ln56_9_fu_486_p2 ( icmp ) </first>
<second>
<count>1</count>
<item_version>0</item_version>
<item>99</item>
</second>
</item>
<item>
<first>icmp_ln56_fu_283_p2 ( icmp ) </first>
<second>
<count>1</count>
<item_version>0</item_version>
<item>63</item>
</second>
</item>
<item>
<first>icmp_ln890_1_fu_327_p2 ( icmp ) </first>
<second>
<count>1</count>
<item_version>0</item_version>
<item>71</item>
</second>
</item>
<item>
<first>icmp_ln890_2_fu_401_p2 ( icmp ) </first>
<second>
<count>1</count>
<item_version>0</item_version>
<item>84</item>
</second>
</item>
<item>
<first>icmp_ln890_3_fu_423_p2 ( icmp ) </first>
<second>
<count>1</count>
<item_version>0</item_version>
<item>88</item>
</second>
</item>
<item>
<first>icmp_ln890_4_fu_497_p2 ( icmp ) </first>
<second>
<count>1</count>
<item_version>0</item_version>
<item>101</item>
</second>
</item>
<item>
<first>icmp_ln890_5_fu_519_p2 ( icmp ) </first>
<second>
<count>1</count>
<item_version>0</item_version>
<item>105</item>
</second>
</item>
<item>
<first>icmp_ln890_fu_305_p2 ( icmp ) </first>
<second>
<count>1</count>
<item_version>0</item_version>
<item>67</item>
</second>
</item>
<item>
<first>icmp_ln92_fu_254_p2 ( icmp ) </first>
<second>
<count>1</count>
<item_version>0</item_version>
<item>52</item>
</second>
</item>
<item>
<first>imgHelper1_4101_din ( select ) </first>
<second>
<count>1</count>
<item_version>0</item_version>
<item>116</item>
</second>
</item>
<item>
<first>or_ln1349_1_fu_575_p2 ( or ) </first>
<second>
<count>1</count>
<item_version>0</item_version>
<item>115</item>
</second>
</item>
<item>
<first>or_ln1349_fu_571_p2 ( or ) </first>
<second>
<count>1</count>
<item_version>0</item_version>
<item>114</item>
</second>
</item>
<item>
<first>xor_ln56_10_fu_513_p2 ( xor ) </first>
<second>
<count>1</count>
<item_version>0</item_version>
<item>104</item>
</second>
</item>
<item>
<first>xor_ln56_11_fu_535_p2 ( xor ) </first>
<second>
<count>1</count>
<item_version>0</item_version>
<item>108</item>
</second>
</item>
<item>
<first>xor_ln56_1_fu_299_p2 ( xor ) </first>
<second>
<count>1</count>
<item_version>0</item_version>
<item>66</item>
</second>
</item>
<item>
<first>xor_ln56_2_fu_321_p2 ( xor ) </first>
<second>
<count>1</count>
<item_version>0</item_version>
<item>70</item>
</second>
</item>
<item>
<first>xor_ln56_3_fu_343_p2 ( xor ) </first>
<second>
<count>1</count>
<item_version>0</item_version>
<item>74</item>
</second>
</item>
<item>
<first>xor_ln56_4_fu_384_p2 ( xor ) </first>
<second>
<count>1</count>
<item_version>0</item_version>
<item>81</item>
</second>
</item>
<item>
<first>xor_ln56_5_fu_395_p2 ( xor ) </first>
<second>
<count>1</count>
<item_version>0</item_version>
<item>83</item>
</second>
</item>
<item>
<first>xor_ln56_6_fu_417_p2 ( xor ) </first>
<second>
<count>1</count>
<item_version>0</item_version>
<item>87</item>
</second>
</item>
<item>
<first>xor_ln56_7_fu_439_p2 ( xor ) </first>
<second>
<count>1</count>
<item_version>0</item_version>
<item>91</item>
</second>
</item>
<item>
<first>xor_ln56_8_fu_480_p2 ( xor ) </first>
<second>
<count>1</count>
<item_version>0</item_version>
<item>98</item>
</second>
</item>
<item>
<first>xor_ln56_9_fu_491_p2 ( xor ) </first>
<second>
<count>1</count>
<item_version>0</item_version>
<item>100</item>
</second>
</item>
<item>
<first>xor_ln56_fu_288_p2 ( xor ) </first>
<second>
<count>1</count>
<item_version>0</item_version>
<item>64</item>
</second>
</item>
<item>
<first>xor_ln890_1_fu_332_p2 ( xor ) </first>
<second>
<count>1</count>
<item_version>0</item_version>
<item>72</item>
</second>
</item>
<item>
<first>xor_ln890_2_fu_406_p2 ( xor ) </first>
<second>
<count>1</count>
<item_version>0</item_version>
<item>85</item>
</second>
</item>
<item>
<first>xor_ln890_3_fu_428_p2 ( xor ) </first>
<second>
<count>1</count>
<item_version>0</item_version>
<item>89</item>
</second>
</item>
<item>
<first>xor_ln890_4_fu_502_p2 ( xor ) </first>
<second>
<count>1</count>
<item_version>0</item_version>
<item>102</item>
</second>
</item>
<item>
<first>xor_ln890_5_fu_524_p2 ( xor ) </first>
<second>
<count>1</count>
<item_version>0</item_version>
<item>106</item>
</second>
</item>
<item>
<first>xor_ln890_fu_310_p2 ( xor ) </first>
<second>
<count>1</count>
<item_version>0</item_version>
<item>68</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="43" tracking_level="0" version="0">
<count>89</count>
<item_version>0</item_version>
<item class_id="44" tracking_level="0" version="0">
<first>23</first>
<second class_id="45" tracking_level="0" version="0">
<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>3</first>
<second>0</second>
</second>
</item>
<item>
<first>26</first>
<second>
<first>3</first>
<second>0</second>
</second>
</item>
<item>
<first>27</first>
<second>
<first>3</first>
<second>0</second>
</second>
</item>
<item>
<first>28</first>
<second>
<first>3</first>
<second>0</second>
</second>
</item>
<item>
<first>29</first>
<second>
<first>3</first>
<second>0</second>
</second>
</item>
<item>
<first>30</first>
<second>
<first>3</first>
<second>0</second>
</second>
</item>
<item>
<first>31</first>
<second>
<first>3</first>
<second>0</second>
</second>
</item>
<item>
<first>32</first>
<second>
<first>3</first>
<second>0</second>
</second>
</item>
<item>
<first>33</first>
<second>
<first>3</first>
<second>0</second>
</second>
</item>
<item>
<first>34</first>
<second>
<first>3</first>
<second>0</second>
</second>
</item>
<item>
<first>35</first>
<second>
<first>3</first>
<second>0</second>
</second>
</item>
<item>
<first>36</first>
<second>
<first>3</first>
<second>0</second>
</second>
</item>
<item>
<first>37</first>
<second>
<first>3</first>
<second>0</second>
</second>
</item>
<item>
<first>38</first>
<second>
<first>3</first>
<second>0</second>
</second>
</item>
<item>
<first>39</first>
<second>
<first>3</first>
<second>0</second>
</second>
</item>
<item>
<first>40</first>
<second>
<first>3</first>
<second>0</second>
</second>
</item>
<item>
<first>41</first>
<second>
<first>3</first>
<second>0</second>
</second>
</item>
<item>
<first>42</first>
<second>
<first>3</first>
<second>0</second>
</second>
</item>
<item>
<first>45</first>
<second>
<first>0</first>
<second>0</second>
</second>
</item>
<item>
<first>46</first>
<second>
<first>0</first>
<second>0</second>
</second>
</item>
<item>
<first>47</first>
<second>
<first>0</first>
<second>3</second>
</second>
</item>
<item>
<first>48</first>
<second>
<first>3</first>
<second>0</second>
</second>
</item>
<item>
<first>50</first>
<second>
<first>4</first>
<second>0</second>
</second>
</item>
<item>
<first>51</first>
<second>
<first>4</first>
<second>0</second>
</second>
</item>
<item>
<first>52</first>
<second>
<first>4</first>
<second>0</second>
</second>
</item>
<item>
<first>53</first>
<second>
<first>4</first>
<second>0</second>
</second>
</item>
<item>
<first>59</first>
<second>
<first>5</first>
<second>0</second>
</second>
</item>
<item>
<first>60</first>
<second>
<first>5</first>
<second>0</second>
</second>
</item>
<item>
<first>61</first>
<second>
<first>5</first>
<second>0</second>
</second>
</item>
<item>
<first>62</first>
<second>
<first>5</first>
<second>0</second>
</second>
</item>
<item>
<first>63</first>
<second>
<first>5</first>
<second>0</second>
</second>
</item>
<item>
<first>64</first>
<second>
<first>5</first>
<second>0</second>
</second>
</item>
<item>
<first>65</first>
<second>
<first>5</first>
<second>0</second>
</second>
</item>
<item>
<first>66</first>
<second>
<first>5</first>
<second>0</second>
</second>
</item>
<item>
<first>67</first>
<second>
<first>5</first>
<second>0</second>
</second>
</item>
<item>
<first>68</first>
<second>
<first>5</first>
<second>0</second>
</second>
</item>
<item>
<first>69</first>
<second>
<first>5</first>
<second>0</second>
</second>
</item>
<item>
<first>70</first>
<second>
<first>5</first>
<second>0</second>
</second>
</item>
<item>
<first>71</first>
<second>
<first>5</first>
<second>0</second>
</second>
</item>
<item>
<first>72</first>
<second>
<first>5</first>
<second>0</second>
</second>
</item>
<item>
<first>73</first>
<second>
<first>5</first>
<second>0</second>
</second>
</item>
<item>
<first>74</first>
<second>
<first>5</first>
<second>0</second>
</second>
</item>
<item>
<first>75</first>
<second>
<first>5</first>
<second>0</second>
</second>
</item>
<item>
<first>76</first>
<second>
<first>5</first>
<second>0</second>
</second>
</item>
<item>
<first>77</first>
<second>
<first>5</first>
<second>0</second>
</second>
</item>
<item>
<first>78</first>
<second>
<first>5</first>
<second>0</second>
</second>
</item>
<item>
<first>79</first>
<second>
<first>5</first>
<second>0</second>
</second>
</item>
<item>
<first>80</first>
<second>
<first>5</first>
<second>0</second>
</second>
</item>
<item>
<first>81</first>
<second>
<first>5</first>
<second>0</second>
</second>
</item>
<item>
<first>82</first>
<second>
<first>5</first>
<second>0</second>
</second>
</item>
<item>
<first>83</first>
<second>
<first>5</first>
<second>0</second>
</second>
</item>
<item>
<first>84</first>
<second>
<first>5</first>
<second>0</second>
</second>
</item>
<item>
<first>85</first>
<second>
<first>5</first>
<second>0</second>
</second>
</item>
<item>
<first>86</first>
<second>
<first>5</first>
<second>0</second>
</second>
</item>
<item>
<first>87</first>
<second>
<first>5</first>
<second>0</second>
</second>
</item>
<item>
<first>88</first>
<second>
<first>5</first>
<second>0</second>
</second>
</item>
<item>
<first>89</first>
<second>
<first>5</first>
<second>0</second>
</second>
</item>
<item>
<first>90</first>
<second>
<first>5</first>
<second>0</second>
</second>
</item>
<item>
<first>91</first>
<second>
<first>5</first>
<second>0</second>
</second>
</item>
<item>
<first>92</first>
<second>
<first>5</first>
<second>0</second>
</second>
</item>
<item>
<first>93</first>
<second>
<first>5</first>
<second>0</second>
</second>
</item>
<item>
<first>94</first>
<second>
<first>5</first>
<second>0</second>
</second>
</item>
<item>
<first>95</first>
<second>
<first>5</first>
<second>0</second>
</second>
</item>
<item>
<first>96</first>
<second>
<first>5</first>
<second>0</second>
</second>
</item>
<item>
<first>97</first>
<second>
<first>5</first>
<second>0</second>
</second>
</item>
<item>
<first>98</first>
<second>
<first>5</first>
<second>0</second>
</second>
</item>
<item>
<first>99</first>
<second>
<first>5</first>
<second>0</second>
</second>
</item>
<item>
<first>100</first>
<second>
<first>5</first>
<second>0</second>
</second>
</item>
<item>
<first>101</first>
<second>
<first>5</first>
<second>0</second>
</second>
</item>
<item>
<first>102</first>
<second>
<first>5</first>
<second>0</second>
</second>
</item>
<item>
<first>103</first>
<second>
<first>5</first>
<second>0</second>
</second>
</item>
<item>
<first>104</first>
<second>
<first>5</first>
<second>0</second>
</second>
</item>
<item>
<first>105</first>
<second>
<first>5</first>
<second>0</second>
</second>
</item>
<item>
<first>106</first>
<second>
<first>5</first>
<second>0</second>
</second>
</item>
<item>
<first>107</first>
<second>
<first>5</first>
<second>0</second>
</second>
</item>
<item>
<first>108</first>
<second>
<first>5</first>
<second>0</second>
</second>
</item>
<item>
<first>109</first>
<second>
<first>5</first>
<second>0</second>
</second>
</item>
<item>
<first>110</first>
<second>
<first>5</first>
<second>0</second>
</second>
</item>
<item>
<first>111</first>
<second>
<first>5</first>
<second>0</second>
</second>
</item>
<item>
<first>112</first>
<second>
<first>5</first>
<second>0</second>
</second>
</item>
<item>
<first>113</first>
<second>
<first>5</first>
<second>0</second>
</second>
</item>
<item>
<first>114</first>
<second>
<first>6</first>
<second>0</second>
</second>
</item>
<item>
<first>115</first>
<second>
<first>6</first>
<second>0</second>
</second>
</item>
<item>
<first>116</first>
<second>
<first>6</first>
<second>0</second>
</second>
</item>
<item>
<first>117</first>
<second>
<first>6</first>
<second>0</second>
</second>
</item>
<item>
<first>118</first>
<second>
<first>6</first>
<second>0</second>
</second>
</item>
<item>
<first>120</first>
<second>
<first>7</first>
<second>0</second>
</second>
</item>
</node_label_latency>
<bblk_ent_exit class_id="46" tracking_level="0" version="0">
<count>4</count>
<item_version>0</item_version>
<item class_id="47" tracking_level="0" version="0">
<first>49</first>
<second class_id="48" tracking_level="0" version="0">
<first>0</first>
<second>3</second>
</second>
</item>
<item>
<first>54</first>
<second>
<first>4</first>
<second>4</second>
</second>
</item>
<item>
<first>119</first>
<second>
<first>5</first>
<second>6</second>
</second>
</item>
<item>
<first>121</first>
<second>
<first>5</first>
<second>5</second>
</second>
</item>
</bblk_ent_exit>
<regions class_id="49" tracking_level="0" version="0">
<count>1</count>
<item_version>0</item_version>
<item class_id="50" tracking_level="1" version="0" object_id="_405">
<region_name>VITIS_LOOP_92_1_VITIS_LOOP_96_2</region_name>
<basic_blocks>
<count>2</count>
<item_version>0</item_version>
<item>54</item>
<item>119</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>85</count>
<item_version>0</item_version>
<item class_id="52" tracking_level="0" version="0">
<first>96</first>
<second>
<count>1</count>
<item_version>0</item_version>
<item>23</item>
</second>
</item>
<item>
<first>102</first>
<second>
<count>1</count>
<item_version>0</item_version>
<item>24</item>
</second>
</item>
<item>
<first>108</first>
<second>
<count>1</count>
<item_version>0</item_version>
<item>25</item>
</second>
</item>
<item>
<first>114</first>
<second>
<count>1</count>
<item_version>0</item_version>
<item>26</item>
</second>
</item>
<item>
<first>120</first>
<second>
<count>1</count>
<item_version>0</item_version>
<item>27</item>
</second>
</item>
<item>
<first>126</first>
<second>
<count>1</count>
<item_version>0</item_version>
<item>28</item>
</second>
</item>
<item>
<first>132</first>
<second>
<count>1</count>
<item_version>0</item_version>
<item>29</item>
</second>
</item>
<item>
<first>138</first>
<second>
<count>1</count>
<item_version>0</item_version>
<item>30</item>
</second>
</item>
<item>
<first>144</first>
<second>
<count>1</count>
<item_version>0</item_version>
<item>31</item>
</second>
</item>
<item>
<first>150</first>
<second>
<count>1</count>
<item_version>0</item_version>
<item>32</item>
</second>
</item>
<item>
<first>156</first>
<second>
<count>1</count>
<item_version>0</item_version>
<item>33</item>
</second>
</item>
<item>
<first>162</first>
<second>
<count>1</count>
<item_version>0</item_version>
<item>34</item>
</second>
</item>
<item>
<first>168</first>
<second>
<count>1</count>
<item_version>0</item_version>
<item>35</item>
</second>
</item>
<item>
<first>174</first>
<second>
<count>1</count>
<item_version>0</item_version>
<item>36</item>
</second>
</item>
<item>
<first>180</first>
<second>
<count>1</count>
<item_version>0</item_version>
<item>37</item>
</second>
</item>
<item>
<first>186</first>
<second>
<count>1</count>
<item_version>0</item_version>
<item>38</item>
</second>
</item>
<item>
<first>192</first>
<second>
<count>1</count>
<item_version>0</item_version>
<item>39</item>
</second>
</item>
<item>
<first>198</first>
<second>
<count>1</count>
<item_version>0</item_version>
<item>40</item>
</second>
</item>
<item>
<first>204</first>
<second>
<count>1</count>
<item_version>0</item_version>
<item>41</item>
</second>
</item>
<item>
<first>210</first>
<second>
<count>1</count>
<item_version>0</item_version>
<item>42</item>
</second>
</item>
<item>
<first>216</first>
<second>
<count>1</count>
<item_version>0</item_version>
<item>59</item>
</second>
</item>
<item>
<first>222</first>
<second>
<count>1</count>
<item_version>0</item_version>
<item>117</item>
</second>
</item>
<item>
<first>233</first>
<second>
<count>1</count>
<item_version>0</item_version>
<item>50</item>
</second>
</item>
<item>
<first>240</first>
<second>
<count>1</count>
<item_version>0</item_version>
<item>45</item>
</second>
</item>
<item>
<first>244</first>
<second>
<count>1</count>
<item_version>0</item_version>
<item>46</item>
</second>
</item>
<item>
<first>248</first>
<second>
<count>1</count>
<item_version>0</item_version>
<item>51</item>
</second>
</item>
<item>
<first>254</first>
<second>
<count>1</count>
<item_version>0</item_version>
<item>52</item>
</second>
</item>
<item>
<first>259</first>
<second>
<count>1</count>
<item_version>0</item_version>
<item>60</item>
</second>
</item>
<item>
<first>263</first>
<second>
<count>1</count>
<item_version>0</item_version>
<item>61</item>
</second>
</item>
<item>
<first>273</first>
<second>
<count>1</count>
<item_version>0</item_version>
<item>62</item>
</second>
</item>
<item>
<first>283</first>
<second>
<count>1</count>
<item_version>0</item_version>
<item>63</item>
</second>
</item>
<item>
<first>288</first>
<second>
<count>1</count>
<item_version>0</item_version>
<item>64</item>
</second>
</item>
<item>
<first>294</first>
<second>
<count>1</count>
<item_version>0</item_version>
<item>65</item>
</second>
</item>
<item>
<first>299</first>
<second>
<count>1</count>
<item_version>0</item_version>
<item>66</item>
</second>
</item>
<item>
<first>305</first>
<second>
<count>1</count>
<item_version>0</item_version>
<item>67</item>
</second>
</item>
<item>
<first>310</first>
<second>
<count>1</count>
<item_version>0</item_version>
<item>68</item>
</second>
</item>
<item>
<first>316</first>
<second>
<count>1</count>
<item_version>0</item_version>
<item>69</item>
</second>
</item>
<item>
<first>321</first>
<second>
<count>1</count>
<item_version>0</item_version>
<item>70</item>
</second>
</item>
<item>
<first>327</first>
<second>
<count>1</count>
<item_version>0</item_version>
<item>71</item>
</second>
</item>
<item>
<first>332</first>
<second>
<count>1</count>
<item_version>0</item_version>
<item>72</item>
</second>
</item>
<item>
<first>338</first>
<second>
<count>1</count>
<item_version>0</item_version>
<item>73</item>
</second>
</item>
<item>
<first>343</first>
<second>
<count>1</count>
<item_version>0</item_version>
<item>74</item>
</second>
</item>
<item>
<first>349</first>
<second>
<count>1</count>
<item_version>0</item_version>
<item>75</item>
</second>
</item>
<item>
<first>355</first>
<second>
<count>1</count>
<item_version>0</item_version>
<item>76</item>
</second>
</item>
<item>
<first>361</first>
<second>
<count>1</count>
<item_version>0</item_version>
<item>77</item>
</second>
</item>
<item>
<first>367</first>
<second>
<count>1</count>
<item_version>0</item_version>
<item>78</item>
</second>
</item>
<item>
<first>373</first>
<second>
<count>1</count>
<item_version>0</item_version>
<item>79</item>
</second>
</item>
<item>
<first>379</first>
<second>
<count>1</count>
<item_version>0</item_version>
<item>80</item>
</second>
</item>
<item>
<first>384</first>
<second>
<count>1</count>
<item_version>0</item_version>
<item>81</item>
</second>
</item>
<item>
<first>390</first>
<second>
<count>1</count>
<item_version>0</item_version>
<item>82</item>
</second>
</item>
<item>
<first>395</first>
<second>
<count>1</count>
<item_version>0</item_version>
<item>83</item>
</second>
</item>
<item>
<first>401</first>
<second>
<count>1</count>
<item_version>0</item_version>
<item>84</item>
</second>
</item>
<item>
<first>406</first>
<second>
<count>1</count>
<item_version>0</item_version>
<item>85</item>
</second>
</item>
<item>
<first>412</first>
<second>
<count>1</count>
<item_version>0</item_version>
<item>86</item>
</second>
</item>
<item>
<first>417</first>
<second>
<count>1</count>
<item_version>0</item_version>
<item>87</item>
</second>
</item>
<item>
<first>423</first>
<second>
<count>1</count>
<item_version>0</item_version>
<item>88</item>
</second>
</item>
<item>
<first>428</first>
<second>
<count>1</count>
<item_version>0</item_version>
<item>89</item>
</second>
</item>
<item>
<first>434</first>
<second>
<count>1</count>
<item_version>0</item_version>
<item>90</item>
</second>
</item>
<item>
<first>439</first>
<second>
<count>1</count>
<item_version>0</item_version>
<item>91</item>
</second>
</item>
<item>
<first>445</first>
<second>
<count>1</count>
<item_version>0</item_version>
<item>92</item>
</second>
</item>
<item>
<first>451</first>
<second>
<count>1</count>
<item_version>0</item_version>
<item>93</item>
</second>
</item>
<item>
<first>457</first>
<second>
<count>1</count>
<item_version>0</item_version>
<item>94</item>
</second>
</item>
<item>
<first>463</first>
<second>
<count>1</count>
<item_version>0</item_version>
<item>95</item>
</second>
</item>
<item>
<first>469</first>
<second>
<count>1</count>
<item_version>0</item_version>
<item>96</item>
</second>
</item>
<item>
<first>475</first>
<second>
<count>1</count>
<item_version>0</item_version>
<item>97</item>
</second>
</item>
<item>
<first>480</first>
<second>
<count>1</count>
<item_version>0</item_version>
<item>98</item>
</second>
</item>
<item>
<first>486</first>
<second>
<count>1</count>
<item_version>0</item_version>
<item>99</item>
</second>
</item>
<item>
<first>491</first>
<second>
<count>1</count>
<item_version>0</item_version>
<item>100</item>
</second>
</item>
<item>
<first>497</first>
<second>
<count>1</count>
<item_version>0</item_version>
<item>101</item>
</second>
</item>
<item>
<first>502</first>
<second>
<count>1</count>
<item_version>0</item_version>
<item>102</item>
</second>
</item>
<item>
<first>508</first>
<second>
<count>1</count>
<item_version>0</item_version>
<item>103</item>
</second>
</item>
<item>
<first>513</first>
<second>
<count>1</count>
<item_version>0</item_version>
<item>104</item>
</second>
</item>
<item>
<first>519</first>
<second>
<count>1</count>
<item_version>0</item_version>
<item>105</item>
</second>
</item>
<item>
<first>524</first>
<second>
<count>1</count>
<item_version>0</item_version>
<item>106</item>
</second>
</item>
<item>
<first>530</first>
<second>
<count>1</count>
<item_version>0</item_version>
<item>107</item>
</second>
</item>
<item>
<first>535</first>
<second>
<count>1</count>
<item_version>0</item_version>
<item>108</item>
</second>
</item>
<item>
<first>541</first>
<second>
<count>1</count>
<item_version>0</item_version>
<item>109</item>
</second>
</item>
<item>
<first>547</first>
<second>
<count>1</count>
<item_version>0</item_version>
<item>110</item>
</second>
</item>
<item>
<first>553</first>
<second>
<count>1</count>
<item_version>0</item_version>
<item>111</item>
</second>
</item>
<item>
<first>559</first>
<second>
<count>1</count>
<item_version>0</item_version>
<item>112</item>
</second>
</item>
<item>
<first>565</first>
<second>
<count>1</count>
<item_version>0</item_version>
<item>113</item>
</second>
</item>
<item>
<first>571</first>
<second>
<count>1</count>
<item_version>0</item_version>
<item>114</item>
</second>
</item>
<item>
<first>575</first>
<second>
<count>1</count>
<item_version>0</item_version>
<item>115</item>
</second>
</item>
<item>
<first>580</first>
<second>
<count>1</count>
<item_version>0</item_version>
<item>116</item>
</second>
</item>
<item>
<first>589</first>
<second>
<count>4</count>
<item_version>0</item_version>
<item>47</item>
<item>47</item>
<item>47</item>
<item>47</item>
</second>
</item>
</dp_fu_nodes>
<dp_fu_nodes_expression class_id="54" tracking_level="0" version="0">
<count>62</count>
<item_version>0</item_version>
<item class_id="55" tracking_level="0" version="0">
<first>add_ln92_fu_248</first>
<second>
<count>1</count>
<item_version>0</item_version>
<item>51</item>
</second>
</item>
<item>
<first>and_ln1348_10_fu_463</first>
<second>
<count>1</count>
<item_version>0</item_version>
<item>95</item>
</second>
</item>
<item>
<first>and_ln1348_11_fu_541</first>
<second>
<count>1</count>
<item_version>0</item_version>
<item>109</item>
</second>
</item>
<item>
<first>and_ln1348_12_fu_547</first>
<second>
<count>1</count>
<item_version>0</item_version>
<item>110</item>
</second>
</item>
<item>
<first>and_ln1348_13_fu_553</first>
<second>
<count>1</count>
<item_version>0</item_version>
<item>111</item>
</second>
</item>
<item>
<first>and_ln1348_14_fu_559</first>
<second>
<count>1</count>
<item_version>0</item_version>
<item>112</item>
</second>
</item>
<item>
<first>and_ln1348_1_fu_373</first>
<second>
<count>1</count>
<item_version>0</item_version>
<item>79</item>
</second>
</item>
<item>
<first>and_ln1348_2_fu_355</first>
<second>
<count>1</count>
<item_version>0</item_version>
<item>76</item>
</second>
</item>
<item>
<first>and_ln1348_3_fu_469</first>
<second>
<count>1</count>
<item_version>0</item_version>
<item>96</item>
</second>
</item>
<item>
<first>and_ln1348_4_fu_361</first>
<second>
<count>1</count>
<item_version>0</item_version>
<item>77</item>
</second>
</item>
<item>
<first>and_ln1348_5_fu_565</first>
<second>
<count>1</count>
<item_version>0</item_version>
<item>113</item>
</second>
</item>
<item>
<first>and_ln1348_6_fu_367</first>
<second>
<count>1</count>
<item_version>0</item_version>
<item>78</item>
</second>
</item>
<item>
<first>and_ln1348_7_fu_445</first>
<second>
<count>1</count>
<item_version>0</item_version>
<item>92</item>
</second>
</item>
<item>
<first>and_ln1348_8_fu_451</first>
<second>
<count>1</count>
<item_version>0</item_version>
<item>93</item>
</second>
</item>
<item>
<first>and_ln1348_9_fu_457</first>
<second>
<count>1</count>
<item_version>0</item_version>
<item>94</item>
</second>
</item>
<item>
<first>and_ln1348_fu_349</first>
<second>
<count>1</count>
<item_version>0</item_version>
<item>75</item>
</second>
</item>
<item>
<first>cast1_fu_244</first>
<second>
<count>1</count>
<item_version>0</item_version>
<item>46</item>
</second>
</item>
<item>
<first>cast_fu_240</first>
<second>
<count>1</count>
<item_version>0</item_version>
<item>45</item>
</second>
</item>
<item>
<first>icmp_ln56_10_fu_508</first>
<second>
<count>1</count>
<item_version>0</item_version>
<item>103</item>
</second>
</item>
<item>
<first>icmp_ln56_11_fu_530</first>
<second>
<count>1</count>
<item_version>0</item_version>
<item>107</item>
</second>
</item>
<item>
<first>icmp_ln56_1_fu_294</first>
<second>
<count>1</count>
<item_version>0</item_version>
<item>65</item>
</second>
</item>
<item>
<first>icmp_ln56_2_fu_316</first>
<second>
<count>1</count>
<item_version>0</item_version>
<item>69</item>
</second>
</item>
<item>
<first>icmp_ln56_3_fu_338</first>
<second>
<count>1</count>
<item_version>0</item_version>
<item>73</item>
</second>
</item>
<item>
<first>icmp_ln56_4_fu_379</first>
<second>
<count>1</count>
<item_version>0</item_version>
<item>80</item>
</second>
</item>
<item>
<first>icmp_ln56_5_fu_390</first>
<second>
<count>1</count>
<item_version>0</item_version>
<item>82</item>
</second>
</item>
<item>
<first>icmp_ln56_6_fu_412</first>
<second>
<count>1</count>
<item_version>0</item_version>
<item>86</item>
</second>
</item>
<item>
<first>icmp_ln56_7_fu_434</first>
<second>
<count>1</count>
<item_version>0</item_version>
<item>90</item>
</second>
</item>
<item>
<first>icmp_ln56_8_fu_475</first>
<second>
<count>1</count>
<item_version>0</item_version>
<item>97</item>
</second>
</item>
<item>
<first>icmp_ln56_9_fu_486</first>
<second>
<count>1</count>
<item_version>0</item_version>
<item>99</item>
</second>
</item>
<item>
<first>icmp_ln56_fu_283</first>
<second>
<count>1</count>
<item_version>0</item_version>
<item>63</item>
</second>
</item>
<item>
<first>icmp_ln890_1_fu_327</first>
<second>
<count>1</count>
<item_version>0</item_version>
<item>71</item>
</second>
</item>
<item>
<first>icmp_ln890_2_fu_401</first>
<second>
<count>1</count>
<item_version>0</item_version>
<item>84</item>
</second>
</item>
<item>
<first>icmp_ln890_3_fu_423</first>
<second>
<count>1</count>
<item_version>0</item_version>
<item>88</item>
</second>
</item>
<item>
<first>icmp_ln890_4_fu_497</first>
<second>
<count>1</count>
<item_version>0</item_version>
<item>101</item>
</second>
</item>
<item>
<first>icmp_ln890_5_fu_519</first>
<second>
<count>1</count>
<item_version>0</item_version>
<item>105</item>
</second>
</item>
<item>
<first>icmp_ln890_fu_305</first>
<second>
<count>1</count>
<item_version>0</item_version>
<item>67</item>
</second>
</item>
<item>
<first>icmp_ln92_fu_254</first>
<second>
<count>1</count>
<item_version>0</item_version>
<item>52</item>
</second>
</item>
<item>
<first>indvar_flatten_phi_fu_233</first>
<second>
<count>1</count>
<item_version>0</item_version>
<item>50</item>
</second>
</item>
<item>
<first>or_ln1349_1_fu_575</first>
<second>
<count>1</count>
<item_version>0</item_version>
<item>115</item>
</second>
</item>
<item>
<first>or_ln1349_fu_571</first>
<second>
<count>1</count>
<item_version>0</item_version>
<item>114</item>
</second>
</item>
<item>
<first>select_ln174_fu_580</first>
<second>
<count>1</count>
<item_version>0</item_version>
<item>116</item>
</second>
</item>
<item>
<first>tmp_val1_V_1_fu_263</first>
<second>
<count>1</count>
<item_version>0</item_version>
<item>61</item>
</second>
</item>
<item>
<first>tmp_val1_V_2_fu_273</first>
<second>
<count>1</count>
<item_version>0</item_version>
<item>62</item>
</second>
</item>
<item>
<first>tmp_val1_V_fu_259</first>
<second>
<count>1</count>
<item_version>0</item_version>
<item>60</item>
</second>
</item>
<item>
<first>xor_ln56_10_fu_513</first>
<second>
<count>1</count>
<item_version>0</item_version>
<item>104</item>
</second>
</item>
<item>
<first>xor_ln56_11_fu_535</first>
<second>
<count>1</count>
<item_version>0</item_version>
<item>108</item>
</second>
</item>
<item>
<first>xor_ln56_1_fu_299</first>
<second>
<count>1</count>
<item_version>0</item_version>
<item>66</item>
</second>
</item>
<item>
<first>xor_ln56_2_fu_321</first>
<second>
<count>1</count>
<item_version>0</item_version>
<item>70</item>
</second>
</item>
<item>
<first>xor_ln56_3_fu_343</first>
<second>
<count>1</count>
<item_version>0</item_version>
<item>74</item>
</second>
</item>
<item>
<first>xor_ln56_4_fu_384</first>
<second>
<count>1</count>
<item_version>0</item_version>
<item>81</item>
</second>
</item>
<item>
<first>xor_ln56_5_fu_395</first>
<second>
<count>1</count>
<item_version>0</item_version>
<item>83</item>
</second>
</item>
<item>
<first>xor_ln56_6_fu_417</first>
<second>
<count>1</count>
<item_version>0</item_version>
<item>87</item>
</second>
</item>
<item>
<first>xor_ln56_7_fu_439</first>
<second>
<count>1</count>
<item_version>0</item_version>
<item>91</item>
</second>
</item>
<item>
<first>xor_ln56_8_fu_480</first>
<second>
<count>1</count>
<item_version>0</item_version>
<item>98</item>
</second>
</item>
<item>
<first>xor_ln56_9_fu_491</first>
<second>
<count>1</count>
<item_version>0</item_version>
<item>100</item>
</second>
</item>
<item>
<first>xor_ln56_fu_288</first>
<second>
<count>1</count>
<item_version>0</item_version>
<item>64</item>
</second>
</item>
<item>
<first>xor_ln890_1_fu_332</first>
<second>
<count>1</count>
<item_version>0</item_version>
<item>72</item>
</second>
</item>
<item>
<first>xor_ln890_2_fu_406</first>
<second>
<count>1</count>
<item_version>0</item_version>
<item>85</item>
</second>
</item>
<item>
<first>xor_ln890_3_fu_428</first>
<second>
<count>1</count>
<item_version>0</item_version>
<item>89</item>
</second>
</item>
<item>
<first>xor_ln890_4_fu_502</first>
<second>
<count>1</count>
<item_version>0</item_version>
<item>102</item>
</second>
</item>
<item>
<first>xor_ln890_5_fu_524</first>
<second>
<count>1</count>
<item_version>0</item_version>
<item>106</item>
</second>
</item>
<item>
<first>xor_ln890_fu_310</first>
<second>
<count>1</count>
<item_version>0</item_version>
<item>68</item>
</second>
</item>
</dp_fu_nodes_expression>
<dp_fu_nodes_module>
<count>1</count>
<item_version>0</item_version>
<item>
<first>grp_fu_589</first>
<second>
<count>4</count>
<item_version>0</item_version>
<item>47</item>
<item>47</item>
<item>47</item>
<item>47</item>
</second>
</item>
</dp_fu_nodes_module>
<dp_fu_nodes_io>
<count>22</count>
<item_version>0</item_version>
<item>
<first>p_read_10_read_fu_150</first>
<second>
<count>1</count>
<item_version>0</item_version>
<item>32</item>
</second>
</item>
<item>
<first>p_read_11_read_fu_156</first>
<second>
<count>1</count>
<item_version>0</item_version>
<item>33</item>
</second>
</item>
<item>
<first>p_read_12_read_fu_162</first>
<second>
<count>1</count>
<item_version>0</item_version>
<item>34</item>
</second>
</item>
<item>
<first>p_read_13_read_fu_168</first>
<second>
<count>1</count>
<item_version>0</item_version>
<item>35</item>
</second>
</item>
<item>
<first>p_read_14_read_fu_174</first>
<second>
<count>1</count>
<item_version>0</item_version>
<item>36</item>
</second>
</item>
<item>
<first>p_read_15_read_fu_180</first>
<second>
<count>1</count>
<item_version>0</item_version>
<item>37</item>
</second>
</item>
<item>
<first>p_read_16_read_fu_186</first>
<second>
<count>1</count>
<item_version>0</item_version>
<item>38</item>
</second>
</item>
<item>
<first>p_read_17_read_fu_192</first>
<second>
<count>1</count>
<item_version>0</item_version>
<item>39</item>
</second>
</item>
<item>
<first>p_read_18_read_fu_198</first>
<second>
<count>1</count>
<item_version>0</item_version>
<item>40</item>
</second>
</item>
<item>
<first>p_read_19_read_fu_204</first>
<second>
<count>1</count>
<item_version>0</item_version>
<item>41</item>
</second>
</item>
<item>
<first>p_read_1_read_fu_96</first>
<second>
<count>1</count>
<item_version>0</item_version>
<item>23</item>
</second>
</item>
<item>
<first>p_read_20_read_fu_210</first>
<second>
<count>1</count>
<item_version>0</item_version>
<item>42</item>
</second>
</item>
<item>
<first>p_read_2_read_fu_102</first>
<second>
<count>1</count>
<item_version>0</item_version>
<item>24</item>
</second>
</item>
<item>
<first>p_read_3_read_fu_108</first>
<second>
<count>1</count>
<item_version>0</item_version>
<item>25</item>
</second>
</item>
<item>
<first>p_read_4_read_fu_114</first>
<second>
<count>1</count>
<item_version>0</item_version>
<item>26</item>
</second>
</item>
<item>
<first>p_read_5_read_fu_120</first>
<second>
<count>1</count>
<item_version>0</item_version>
<item>27</item>
</second>
</item>
<item>
<first>p_read_6_read_fu_126</first>
<second>
<count>1</count>
<item_version>0</item_version>
<item>28</item>
</second>
</item>
<item>
<first>p_read_7_read_fu_132</first>
<second>
<count>1</count>
<item_version>0</item_version>
<item>29</item>
</second>
</item>
<item>
<first>p_read_8_read_fu_138</first>
<second>
<count>1</count>
<item_version>0</item_version>
<item>30</item>
</second>
</item>
<item>
<first>p_read_9_read_fu_144</first>
<second>
<count>1</count>
<item_version>0</item_version>
<item>31</item>
</second>
</item>
<item>
<first>tmp_V_read_fu_216</first>
<second>
<count>1</count>
<item_version>0</item_version>
<item>59</item>
</second>
</item>
<item>
<first>write_ln174_write_fu_222</first>
<second>
<count>1</count>
<item_version>0</item_version>
<item>117</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="56" tracking_level="0" version="0">
<count>0</count>
<item_version>0</item_version>
</dp_mem_port_nodes>
<dp_reg_nodes>
<count>27</count>
<item_version>0</item_version>
<item>
<first>229</first>
<second>
<count>1</count>
<item_version>0</item_version>
<item>50</item>
</second>
</item>
<item>
<first>595</first>
<second>
<count>1</count>
<item_version>0</item_version>
<item>45</item>
</second>
</item>
<item>
<first>600</first>
<second>
<count>1</count>
<item_version>0</item_version>
<item>46</item>
</second>
</item>
<item>
<first>605</first>
<second>
<count>1</count>
<item_version>0</item_version>
<item>25</item>
</second>
</item>
<item>
<first>610</first>
<second>
<count>1</count>
<item_version>0</item_version>
<item>26</item>
</second>
</item>
<item>
<first>615</first>
<second>
<count>1</count>
<item_version>0</item_version>
<item>27</item>
</second>
</item>
<item>
<first>620</first>
<second>
<count>1</count>
<item_version>0</item_version>
<item>28</item>
</second>
</item>
<item>
<first>625</first>
<second>
<count>1</count>
<item_version>0</item_version>
<item>29</item>
</second>
</item>
<item>
<first>630</first>
<second>
<count>1</count>
<item_version>0</item_version>
<item>30</item>
</second>
</item>
<item>
<first>635</first>
<second>
<count>1</count>
<item_version>0</item_version>
<item>31</item>
</second>
</item>
<item>
<first>640</first>
<second>
<count>1</count>
<item_version>0</item_version>
<item>32</item>
</second>
</item>
<item>
<first>645</first>
<second>
<count>1</count>
<item_version>0</item_version>
<item>33</item>
</second>
</item>
<item>
<first>650</first>
<second>
<count>1</count>
<item_version>0</item_version>
<item>34</item>
</second>
</item>
<item>
<first>655</first>
<second>
<count>1</count>
<item_version>0</item_version>
<item>35</item>
</second>
</item>
<item>
<first>660</first>
<second>
<count>1</count>
<item_version>0</item_version>
<item>36</item>
</second>
</item>
<item>
<first>665</first>
<second>
<count>1</count>
<item_version>0</item_version>
<item>37</item>
</second>
</item>
<item>
<first>670</first>
<second>
<count>1</count>
<item_version>0</item_version>
<item>38</item>
</second>
</item>
<item>
<first>675</first>
<second>
<count>1</count>
<item_version>0</item_version>
<item>39</item>
</second>
</item>
<item>
<first>680</first>
<second>
<count>1</count>
<item_version>0</item_version>
<item>40</item>
</second>
</item>
<item>
<first>685</first>
<second>
<count>1</count>
<item_version>0</item_version>
<item>41</item>
</second>
</item>
<item>
<first>690</first>
<second>
<count>1</count>
<item_version>0</item_version>
<item>42</item>
</second>
</item>
<item>
<first>695</first>
<second>
<count>1</count>
<item_version>0</item_version>
<item>47</item>
</second>
</item>
<item>
<first>700</first>
<second>
<count>1</count>
<item_version>0</item_version>
<item>51</item>
</second>
</item>
<item>
<first>705</first>
<second>
<count>1</count>
<item_version>0</item_version>
<item>52</item>
</second>
</item>
<item>
<first>709</first>
<second>
<count>1</count>
<item_version>0</item_version>
<item>79</item>
</second>
</item>
<item>
<first>714</first>
<second>
<count>1</count>
<item_version>0</item_version>
<item>96</item>
</second>
</item>
<item>
<first>719</first>
<second>
<count>1</count>
<item_version>0</item_version>
<item>113</item>
</second>
</item>
</dp_reg_nodes>
<dp_regname_nodes>
<count>27</count>
<item_version>0</item_version>
<item>
<first>add_ln92_reg_700</first>
<second>
<count>1</count>
<item_version>0</item_version>
<item>51</item>
</second>
</item>
<item>
<first>and_ln1348_1_reg_709</first>
<second>
<count>1</count>
<item_version>0</item_version>
<item>79</item>
</second>
</item>
<item>
<first>and_ln1348_3_reg_714</first>
<second>
<count>1</count>
<item_version>0</item_version>
<item>96</item>
</second>
</item>
<item>
<first>and_ln1348_5_reg_719</first>
<second>
<count>1</count>
<item_version>0</item_version>
<item>113</item>
</second>
</item>
<item>
<first>bound_reg_695</first>
<second>
<count>1</count>
<item_version>0</item_version>
<item>47</item>
</second>
</item>
<item>
<first>cast1_reg_600</first>
<second>
<count>1</count>
<item_version>0</item_version>
<item>46</item>
</second>
</item>
<item>
<first>cast_reg_595</first>
<second>
<count>1</count>
<item_version>0</item_version>
<item>45</item>
</second>
</item>
<item>
<first>icmp_ln92_reg_705</first>
<second>
<count>1</count>
<item_version>0</item_version>
<item>52</item>
</second>
</item>
<item>
<first>indvar_flatten_reg_229</first>
<second>
<count>1</count>
<item_version>0</item_version>
<item>50</item>
</second>
</item>
<item>
<first>p_read_10_reg_640</first>
<second>
<count>1</count>
<item_version>0</item_version>
<item>32</item>
</second>
</item>
<item>
<first>p_read_11_reg_645</first>
<second>
<count>1</count>
<item_version>0</item_version>
<item>33</item>
</second>
</item>
<item>
<first>p_read_12_reg_650</first>
<second>
<count>1</count>
<item_version>0</item_version>
<item>34</item>
</second>
</item>
<item>
<first>p_read_13_reg_655</first>
<second>
<count>1</count>
<item_version>0</item_version>
<item>35</item>
</second>
</item>
<item>
<first>p_read_14_reg_660</first>
<second>
<count>1</count>
<item_version>0</item_version>
<item>36</item>
</second>
</item>
<item>
<first>p_read_15_reg_665</first>
<second>
<count>1</count>
<item_version>0</item_version>
<item>37</item>
</second>
</item>
<item>
<first>p_read_16_reg_670</first>
<second>
<count>1</count>
<item_version>0</item_version>
<item>38</item>
</second>
</item>
<item>
<first>p_read_17_reg_675</first>
<second>
<count>1</count>
<item_version>0</item_version>
<item>39</item>
</second>
</item>
<item>
<first>p_read_18_reg_680</first>
<second>
<count>1</count>
<item_version>0</item_version>
<item>40</item>
</second>
</item>
<item>
<first>p_read_19_reg_685</first>
<second>
<count>1</count>
<item_version>0</item_version>
<item>41</item>
</second>
</item>
<item>
<first>p_read_20_reg_690</first>
<second>
<count>1</count>
<item_version>0</item_version>
<item>42</item>
</second>
</item>
<item>
<first>p_read_3_reg_605</first>
<second>
<count>1</count>
<item_version>0</item_version>
<item>25</item>
</second>
</item>
<item>
<first>p_read_4_reg_610</first>
<second>
<count>1</count>
<item_version>0</item_version>
<item>26</item>
</second>
</item>
<item>
<first>p_read_5_reg_615</first>
<second>
<count>1</count>
<item_version>0</item_version>
<item>27</item>
</second>
</item>
<item>
<first>p_read_6_reg_620</first>
<second>
<count>1</count>
<item_version>0</item_version>
<item>28</item>
</second>
</item>
<item>
<first>p_read_7_reg_625</first>
<second>
<count>1</count>
<item_version>0</item_version>
<item>29</item>
</second>
</item>
<item>
<first>p_read_8_reg_630</first>
<second>
<count>1</count>
<item_version>0</item_version>
<item>30</item>
</second>
</item>
<item>
<first>p_read_9_reg_635</first>
<second>
<count>1</count>
<item_version>0</item_version>
<item>31</item>
</second>
</item>
</dp_regname_nodes>
<dp_reg_phi>
<count>1</count>
<item_version>0</item_version>
<item>
<first>229</first>
<second>
<count>1</count>
<item_version>0</item_version>
<item>50</item>
</second>
</item>
</dp_reg_phi>
<dp_regname_phi>
<count>1</count>
<item_version>0</item_version>
<item>
<first>indvar_flatten_reg_229</first>
<second>
<count>1</count>
<item_version>0</item_version>
<item>50</item>
</second>
</item>
</dp_regname_phi>
<dp_port_io_nodes class_id="57" tracking_level="0" version="0">
<count>22</count>
<item_version>0</item_version>
<item class_id="58" tracking_level="0" version="0">
<first>imgHelper1_4101</first>
<second>
<count>1</count>
<item_version>0</item_version>
<item>
<first>write</first>
<second>
<count>1</count>
<item_version>0</item_version>
<item>117</item>
</second>
</item>
</second>
</item>
<item>
<first>p_read</first>
<second>
<count>1</count>
<item_version>0</item_version>
<item>
<first>read</first>
<second>
<count>1</count>
<item_version>0</item_version>
<item>42</item>
</second>
</item>
</second>
</item>
<item>
<first>p_read1</first>
<second>
<count>1</count>
<item_version>0</item_version>
<item>
<first>read</first>
<second>
<count>1</count>
<item_version>0</item_version>
<item>41</item>
</second>
</item>
</second>
</item>
<item>
<first>p_read10</first>
<second>
<count>1</count>
<item_version>0</item_version>
<item>
<first>read</first>
<second>
<count>1</count>
<item_version>0</item_version>
<item>32</item>
</second>
</item>
</second>
</item>
<item>
<first>p_read11</first>
<second>
<count>1</count>
<item_version>0</item_version>
<item>
<first>read</first>
<second>
<count>1</count>
<item_version>0</item_version>
<item>31</item>
</second>
</item>
</second>
</item>
<item>
<first>p_read12</first>
<second>
<count>1</count>
<item_version>0</item_version>
<item>
<first>read</first>
<second>
<count>1</count>
<item_version>0</item_version>
<item>30</item>
</second>
</item>
</second>
</item>
<item>
<first>p_read13</first>
<second>
<count>1</count>
<item_version>0</item_version>
<item>
<first>read</first>
<second>
<count>1</count>
<item_version>0</item_version>
<item>29</item>
</second>
</item>
</second>
</item>
<item>
<first>p_read14</first>
<second>
<count>1</count>
<item_version>0</item_version>
<item>
<first>read</first>
<second>
<count>1</count>
<item_version>0</item_version>
<item>28</item>
</second>
</item>
</second>
</item>
<item>
<first>p_read15</first>
<second>
<count>1</count>
<item_version>0</item_version>
<item>
<first>read</first>
<second>
<count>1</count>
<item_version>0</item_version>
<item>27</item>
</second>
</item>
</second>
</item>
<item>
<first>p_read16</first>
<second>
<count>1</count>
<item_version>0</item_version>
<item>
<first>read</first>
<second>
<count>1</count>
<item_version>0</item_version>
<item>26</item>
</second>
</item>
</second>
</item>
<item>
<first>p_read17</first>
<second>
<count>1</count>
<item_version>0</item_version>
<item>
<first>read</first>
<second>
<count>1</count>
<item_version>0</item_version>
<item>25</item>
</second>
</item>
</second>
</item>
<item>
<first>p_read18</first>
<second>
<count>1</count>
<item_version>0</item_version>
<item>
<first>read</first>
<second>
<count>1</count>
<item_version>0</item_version>
<item>24</item>
</second>
</item>
</second>
</item>
<item>
<first>p_read19</first>
<second>
<count>1</count>
<item_version>0</item_version>
<item>
<first>read</first>
<second>
<count>1</count>
<item_version>0</item_version>
<item>23</item>
</second>
</item>
</second>
</item>
<item>
<first>p_read2</first>
<second>
<count>1</count>
<item_version>0</item_version>
<item>
<first>read</first>
<second>
<count>1</count>
<item_version>0</item_version>
<item>40</item>
</second>
</item>
</second>
</item>
<item>
<first>p_read3</first>
<second>
<count>1</count>
<item_version>0</item_version>
<item>
<first>read</first>
<second>
<count>1</count>
<item_version>0</item_version>
<item>39</item>
</second>
</item>
</second>
</item>
<item>
<first>p_read4</first>
<second>
<count>1</count>
<item_version>0</item_version>
<item>
<first>read</first>
<second>
<count>1</count>
<item_version>0</item_version>
<item>38</item>
</second>
</item>
</second>
</item>
<item>
<first>p_read5</first>
<second>
<count>1</count>
<item_version>0</item_version>
<item>
<first>read</first>
<second>
<count>1</count>
<item_version>0</item_version>
<item>37</item>
</second>
</item>
</second>
</item>
<item>
<first>p_read6</first>
<second>
<count>1</count>
<item_version>0</item_version>
<item>
<first>read</first>
<second>
<count>1</count>
<item_version>0</item_version>
<item>36</item>
</second>
</item>
</second>
</item>
<item>
<first>p_read7</first>
<second>
<count>1</count>
<item_version>0</item_version>
<item>
<first>read</first>
<second>
<count>1</count>
<item_version>0</item_version>
<item>35</item>
</second>
</item>
</second>
</item>
<item>
<first>p_read8</first>
<second>
<count>1</count>
<item_version>0</item_version>
<item>
<first>read</first>
<second>
<count>1</count>
<item_version>0</item_version>
<item>34</item>
</second>
</item>
</second>
</item>
<item>
<first>p_read9</first>
<second>
<count>1</count>
<item_version>0</item_version>
<item>
<first>read</first>
<second>
<count>1</count>
<item_version>0</item_version>
<item>33</item>
</second>
</item>
</second>
</item>
<item>
<first>rgb2hsv_4100</first>
<second>
<count>1</count>
<item_version>0</item_version>
<item>
<first>read</first>
<second>
<count>1</count>
<item_version>0</item_version>
<item>59</item>
</second>
</item>
</second>
</item>
</dp_port_io_nodes>
<port2core>
<count>2</count>
<item_version>0</item_version>
<item>
<first>1</first>
<second>
<first>1150</first>
<second>10</second>
</second>
</item>
<item>
<first>2</first>
<second>
<first>1151</first>
<second>10</second>
</second>
</item>
</port2core>
<node2core>
<count>59</count>
<item_version>0</item_version>
<item>
<first>47</first>
<second>
<first>12</first>
<second>3</second>
</second>
</item>
<item>
<first>51</first>
<second>
<first>8</first>
<second>4</second>
</second>
</item>
<item>
<first>52</first>
<second>
<first>45</first>
<second>0</second>
</second>
</item>
<item>
<first>59</first>
<second>
<first>1150</first>
<second>10</second>
</second>
</item>
<item>
<first>63</first>
<second>
<first>45</first>
<second>0</second>
</second>
</item>
<item>
<first>64</first>
<second>
<first>25</first>
<second>0</second>
</second>
</item>
<item>
<first>65</first>
<second>
<first>45</first>
<second>0</second>
</second>
</item>
<item>
<first>66</first>
<second>
<first>25</first>
<second>0</second>
</second>
</item>
<item>
<first>67</first>
<second>
<first>45</first>
<second>0</second>
</second>
</item>
<item>
<first>68</first>
<second>
<first>25</first>
<second>0</second>
</second>
</item>
<item>
<first>69</first>
<second>
<first>45</first>
<second>0</second>
</second>
</item>
<item>
<first>70</first>
<second>
<first>25</first>
<second>0</second>
</second>
</item>
<item>
<first>71</first>
<second>
<first>45</first>
<second>0</second>
</second>
</item>
<item>
<first>72</first>
<second>
<first>25</first>
<second>0</second>
</second>
</item>
<item>
<first>73</first>
<second>
<first>45</first>
<second>0</second>
</second>
</item>
<item>
<first>74</first>
<second>
<first>25</first>
<second>0</second>
</second>
</item>
<item>
<first>75</first>
<second>
<first>23</first>
<second>0</second>
</second>
</item>
<item>
<first>76</first>
<second>
<first>23</first>
<second>0</second>
</second>
</item>
<item>
<first>77</first>
<second>
<first>23</first>
<second>0</second>
</second>
</item>
<item>
<first>78</first>
<second>
<first>23</first>
<second>0</second>
</second>
</item>
<item>
<first>79</first>
<second>
<first>23</first>
<second>0</second>
</second>
</item>
<item>
<first>80</first>
<second>
<first>45</first>
<second>0</second>
</second>
</item>
<item>
<first>81</first>
<second>
<first>25</first>
<second>0</second>
</second>
</item>
<item>
<first>82</first>
<second>
<first>45</first>
<second>0</second>
</second>
</item>
<item>
<first>83</first>
<second>
<first>25</first>
<second>0</second>
</second>
</item>
<item>
<first>84</first>
<second>
<first>45</first>
<second>0</second>
</second>
</item>
<item>
<first>85</first>
<second>
<first>25</first>
<second>0</second>
</second>
</item>
<item>
<first>86</first>
<second>
<first>45</first>
<second>0</second>
</second>
</item>
<item>
<first>87</first>
<second>
<first>25</first>
<second>0</second>
</second>
</item>
<item>
<first>88</first>
<second>
<first>45</first>
<second>0</second>
</second>
</item>
<item>
<first>89</first>
<second>
<first>25</first>
<second>0</second>
</second>
</item>
<item>
<first>90</first>
<second>
<first>45</first>
<second>0</second>
</second>
</item>
<item>
<first>91</first>
<second>
<first>25</first>
<second>0</second>
</second>
</item>
<item>
<first>92</first>
<second>
<first>23</first>
<second>0</second>
</second>
</item>
<item>
<first>93</first>
<second>
<first>23</first>
<second>0</second>
</second>
</item>
<item>
<first>94</first>
<second>
<first>23</first>
<second>0</second>
</second>
</item>
<item>
<first>95</first>
<second>
<first>23</first>
<second>0</second>
</second>
</item>
<item>
<first>96</first>
<second>
<first>23</first>
<second>0</second>
</second>
</item>
<item>
<first>97</first>
<second>
<first>45</first>
<second>0</second>
</second>
</item>
<item>
<first>98</first>
<second>
<first>25</first>
<second>0</second>
</second>
</item>
<item>
<first>99</first>
<second>
<first>45</first>
<second>0</second>
</second>
</item>
<item>
<first>100</first>
<second>
<first>25</first>
<second>0</second>
</second>
</item>
<item>
<first>101</first>
<second>
<first>45</first>
<second>0</second>
</second>
</item>
<item>
<first>102</first>
<second>
<first>25</first>
<second>0</second>
</second>
</item>
<item>
<first>103</first>
<second>
<first>45</first>
<second>0</second>
</second>
</item>
<item>
<first>104</first>
<second>
<first>25</first>
<second>0</second>
</second>
</item>
<item>
<first>105</first>
<second>
<first>45</first>
<second>0</second>
</second>
</item>
<item>
<first>106</first>
<second>
<first>25</first>
<second>0</second>
</second>
</item>
<item>
<first>107</first>
<second>
<first>45</first>
<second>0</second>
</second>
</item>
<item>
<first>108</first>
<second>
<first>25</first>
<second>0</second>
</second>
</item>
<item>
<first>109</first>
<second>
<first>23</first>
<second>0</second>
</second>
</item>
<item>
<first>110</first>
<second>
<first>23</first>
<second>0</second>
</second>
</item>
<item>
<first>111</first>
<second>
<first>23</first>
<second>0</second>
</second>
</item>
<item>
<first>112</first>
<second>
<first>23</first>
<second>0</second>
</second>
</item>
<item>
<first>113</first>
<second>
<first>23</first>
<second>0</second>
</second>
</item>
<item>
<first>114</first>
<second>
<first>24</first>
<second>0</second>
</second>
</item>
<item>
<first>115</first>
<second>
<first>24</first>
<second>0</second>
</second>
</item>
<item>
<first>116</first>
<second>
<first>49</first>
<second>107</second>
</second>
</item>
<item>
<first>117</first>
<second>
<first>1151</first>
<second>10</second>
</second>
</item>
</node2core>
</syndb>
</boost_serialization>
| 31.644631 | 151 | 0.461565 |
20b2e049d8b4b7b54302abaaceb843145547e746 | 30,752 | ads | Ada | arch/ARM/NXP/svd/lpc55s6x/nxp_svd-flash_key_store.ads | morbos/Ada_Drivers_Library | a4ab26799be60997c38735f4056160c4af597ef7 | [
"BSD-3-Clause"
] | 2 | 2018-05-16T03:56:39.000Z | 2019-07-31T13:53:56.000Z | arch/ARM/NXP/svd/lpc55s6x/nxp_svd-flash_key_store.ads | morbos/Ada_Drivers_Library | a4ab26799be60997c38735f4056160c4af597ef7 | [
"BSD-3-Clause"
] | null | null | null | arch/ARM/NXP/svd/lpc55s6x/nxp_svd-flash_key_store.ads | morbos/Ada_Drivers_Library | a4ab26799be60997c38735f4056160c4af597ef7 | [
"BSD-3-Clause"
] | null | null | null | -- Copyright 2016-2019 NXP
-- All rights reserved.SPDX-License-Identifier: BSD-3-Clause
-- This spec has been automatically generated from LPC55S6x.svd
pragma Restrictions (No_Elaboration_Code);
pragma Ada_2012;
pragma Style_Checks (Off);
with HAL;
with System;
package NXP_SVD.FLASH_KEY_STORE is
pragma Preelaborate;
---------------
-- Registers --
---------------
-- .
-- .
type ACTIVATION_CODE_Registers is array (0 .. 297) of HAL.UInt32
with Volatile;
subtype SBKEY_HEADER1_TYPE_Field is HAL.UInt2;
subtype SBKEY_HEADER1_INDEX_Field is HAL.UInt4;
subtype SBKEY_HEADER1_SIZE_Field is HAL.UInt6;
-- .
type SBKEY_HEADER1_Register is record
-- .
TYPE_k : SBKEY_HEADER1_TYPE_Field := 16#0#;
-- unspecified
Reserved_2_7 : HAL.UInt6 := 16#0#;
-- .
INDEX : SBKEY_HEADER1_INDEX_Field := 16#0#;
-- unspecified
Reserved_12_23 : HAL.UInt12 := 16#0#;
-- .
SIZE : SBKEY_HEADER1_SIZE_Field := 16#0#;
-- unspecified
Reserved_30_31 : HAL.UInt2 := 16#0#;
end record
with Volatile_Full_Access, Size => 32,
Bit_Order => System.Low_Order_First;
for SBKEY_HEADER1_Register use record
TYPE_k at 0 range 0 .. 1;
Reserved_2_7 at 0 range 2 .. 7;
INDEX at 0 range 8 .. 11;
Reserved_12_23 at 0 range 12 .. 23;
SIZE at 0 range 24 .. 29;
Reserved_30_31 at 0 range 30 .. 31;
end record;
subtype USER_KEK_HEADER1_TYPE_Field is HAL.UInt2;
subtype USER_KEK_HEADER1_INDEX_Field is HAL.UInt4;
subtype USER_KEK_HEADER1_SIZE_Field is HAL.UInt6;
-- .
type USER_KEK_HEADER1_Register is record
-- .
TYPE_k : USER_KEK_HEADER1_TYPE_Field := 16#0#;
-- unspecified
Reserved_2_7 : HAL.UInt6 := 16#0#;
-- .
INDEX : USER_KEK_HEADER1_INDEX_Field := 16#0#;
-- unspecified
Reserved_12_23 : HAL.UInt12 := 16#0#;
-- .
SIZE : USER_KEK_HEADER1_SIZE_Field := 16#0#;
-- unspecified
Reserved_30_31 : HAL.UInt2 := 16#0#;
end record
with Volatile_Full_Access, Size => 32,
Bit_Order => System.Low_Order_First;
for USER_KEK_HEADER1_Register use record
TYPE_k at 0 range 0 .. 1;
Reserved_2_7 at 0 range 2 .. 7;
INDEX at 0 range 8 .. 11;
Reserved_12_23 at 0 range 12 .. 23;
SIZE at 0 range 24 .. 29;
Reserved_30_31 at 0 range 30 .. 31;
end record;
subtype UDS_HEADER1_TYPE_Field is HAL.UInt2;
subtype UDS_HEADER1_INDEX_Field is HAL.UInt4;
subtype UDS_HEADER1_SIZE_Field is HAL.UInt6;
-- .
type UDS_HEADER1_Register is record
-- .
TYPE_k : UDS_HEADER1_TYPE_Field := 16#0#;
-- unspecified
Reserved_2_7 : HAL.UInt6 := 16#0#;
-- .
INDEX : UDS_HEADER1_INDEX_Field := 16#0#;
-- unspecified
Reserved_12_23 : HAL.UInt12 := 16#0#;
-- .
SIZE : UDS_HEADER1_SIZE_Field := 16#0#;
-- unspecified
Reserved_30_31 : HAL.UInt2 := 16#0#;
end record
with Volatile_Full_Access, Size => 32,
Bit_Order => System.Low_Order_First;
for UDS_HEADER1_Register use record
TYPE_k at 0 range 0 .. 1;
Reserved_2_7 at 0 range 2 .. 7;
INDEX at 0 range 8 .. 11;
Reserved_12_23 at 0 range 12 .. 23;
SIZE at 0 range 24 .. 29;
Reserved_30_31 at 0 range 30 .. 31;
end record;
subtype PRINCE_REGION0_HEADER1_TYPE_Field is HAL.UInt2;
subtype PRINCE_REGION0_HEADER1_INDEX_Field is HAL.UInt4;
subtype PRINCE_REGION0_HEADER1_SIZE_Field is HAL.UInt6;
-- .
type PRINCE_REGION0_HEADER1_Register is record
-- .
TYPE_k : PRINCE_REGION0_HEADER1_TYPE_Field := 16#0#;
-- unspecified
Reserved_2_7 : HAL.UInt6 := 16#0#;
-- .
INDEX : PRINCE_REGION0_HEADER1_INDEX_Field := 16#0#;
-- unspecified
Reserved_12_23 : HAL.UInt12 := 16#0#;
-- .
SIZE : PRINCE_REGION0_HEADER1_SIZE_Field := 16#0#;
-- unspecified
Reserved_30_31 : HAL.UInt2 := 16#0#;
end record
with Volatile_Full_Access, Size => 32,
Bit_Order => System.Low_Order_First;
for PRINCE_REGION0_HEADER1_Register use record
TYPE_k at 0 range 0 .. 1;
Reserved_2_7 at 0 range 2 .. 7;
INDEX at 0 range 8 .. 11;
Reserved_12_23 at 0 range 12 .. 23;
SIZE at 0 range 24 .. 29;
Reserved_30_31 at 0 range 30 .. 31;
end record;
subtype PRINCE_REGION1_HEADER1_TYPE_Field is HAL.UInt2;
subtype PRINCE_REGION1_HEADER1_INDEX_Field is HAL.UInt4;
subtype PRINCE_REGION1_HEADER1_SIZE_Field is HAL.UInt6;
-- .
type PRINCE_REGION1_HEADER1_Register is record
-- .
TYPE_k : PRINCE_REGION1_HEADER1_TYPE_Field := 16#0#;
-- unspecified
Reserved_2_7 : HAL.UInt6 := 16#0#;
-- .
INDEX : PRINCE_REGION1_HEADER1_INDEX_Field := 16#0#;
-- unspecified
Reserved_12_23 : HAL.UInt12 := 16#0#;
-- .
SIZE : PRINCE_REGION1_HEADER1_SIZE_Field := 16#0#;
-- unspecified
Reserved_30_31 : HAL.UInt2 := 16#0#;
end record
with Volatile_Full_Access, Size => 32,
Bit_Order => System.Low_Order_First;
for PRINCE_REGION1_HEADER1_Register use record
TYPE_k at 0 range 0 .. 1;
Reserved_2_7 at 0 range 2 .. 7;
INDEX at 0 range 8 .. 11;
Reserved_12_23 at 0 range 12 .. 23;
SIZE at 0 range 24 .. 29;
Reserved_30_31 at 0 range 30 .. 31;
end record;
subtype PRINCE_REGION2_HEADER1_TYPE_Field is HAL.UInt2;
subtype PRINCE_REGION2_HEADER1_INDEX_Field is HAL.UInt4;
subtype PRINCE_REGION2_HEADER1_SIZE_Field is HAL.UInt6;
-- .
type PRINCE_REGION2_HEADER1_Register is record
-- .
TYPE_k : PRINCE_REGION2_HEADER1_TYPE_Field := 16#0#;
-- unspecified
Reserved_2_7 : HAL.UInt6 := 16#0#;
-- .
INDEX : PRINCE_REGION2_HEADER1_INDEX_Field := 16#0#;
-- unspecified
Reserved_12_23 : HAL.UInt12 := 16#0#;
-- .
SIZE : PRINCE_REGION2_HEADER1_SIZE_Field := 16#0#;
-- unspecified
Reserved_30_31 : HAL.UInt2 := 16#0#;
end record
with Volatile_Full_Access, Size => 32,
Bit_Order => System.Low_Order_First;
for PRINCE_REGION2_HEADER1_Register use record
TYPE_k at 0 range 0 .. 1;
Reserved_2_7 at 0 range 2 .. 7;
INDEX at 0 range 8 .. 11;
Reserved_12_23 at 0 range 12 .. 23;
SIZE at 0 range 24 .. 29;
Reserved_30_31 at 0 range 30 .. 31;
end record;
-----------------
-- Peripherals --
-----------------
type FLASH_KEY_STORE_Disc is
(
Header0,
Key_Code0,
Header1,
Key_Code1,
Body0,
Key_Code2,
Body1,
Key_Code3,
Body2,
Key_Code4,
Body3,
Key_Code5,
Body4,
Key_Code6,
Body5,
Key_Code7,
Body6,
Key_Code8,
Body7,
Key_Code9,
Body8,
Key_Code10,
Body9,
Key_Code11,
Body10,
Key_Code12,
Body11,
Key_Code13);
-- FLASH_KEY_STORE
type FLASH_KEY_STORE_Peripheral
(Discriminent : FLASH_KEY_STORE_Disc := Header0)
is record
-- Valid Key Sore Header : 0x95959595
HEADER : aliased HAL.UInt32;
-- puf discharge time in ms.
puf_discharge_time_in_ms : aliased HAL.UInt32;
-- .
ACTIVATION_CODE : aliased ACTIVATION_CODE_Registers;
case Discriminent is
when Header0 =>
-- .
SBKEY_HEADER0 : aliased HAL.UInt32;
-- .
USER_KEK_HEADER0 : aliased HAL.UInt32;
-- .
UDS_HEADER0 : aliased HAL.UInt32;
-- .
PRINCE_REGION0_HEADER0 : aliased HAL.UInt32;
-- .
PRINCE_REGION1_HEADER0 : aliased HAL.UInt32;
-- .
PRINCE_REGION2_HEADER0 : aliased HAL.UInt32;
when Key_Code0 =>
-- .
SBKEY_KEY_CODE0 : aliased HAL.UInt32;
-- .
USER_KEK_KEY_CODE0 : aliased HAL.UInt32;
-- .
UDS_KEY_CODE0 : aliased HAL.UInt32;
-- .
PRINCE_REGION0_KEY_CODE0 : aliased HAL.UInt32;
-- .
PRINCE_REGION1_KEY_CODE0 : aliased HAL.UInt32;
-- .
PRINCE_REGION2_KEY_CODE0 : aliased HAL.UInt32;
when Header1 =>
-- .
SBKEY_HEADER1 : aliased SBKEY_HEADER1_Register;
-- .
USER_KEK_HEADER1 : aliased USER_KEK_HEADER1_Register;
-- .
UDS_HEADER1 : aliased UDS_HEADER1_Register;
-- .
PRINCE_REGION0_HEADER1 : aliased PRINCE_REGION0_HEADER1_Register;
-- .
PRINCE_REGION1_HEADER1 : aliased PRINCE_REGION1_HEADER1_Register;
-- .
PRINCE_REGION2_HEADER1 : aliased PRINCE_REGION2_HEADER1_Register;
when Key_Code1 =>
-- .
SBKEY_KEY_CODE1 : aliased HAL.UInt32;
-- .
USER_KEK_KEY_CODE1 : aliased HAL.UInt32;
-- .
UDS_KEY_CODE1 : aliased HAL.UInt32;
-- .
PRINCE_REGION0_KEY_CODE1 : aliased HAL.UInt32;
-- .
PRINCE_REGION1_KEY_CODE1 : aliased HAL.UInt32;
-- .
PRINCE_REGION2_KEY_CODE1 : aliased HAL.UInt32;
when Body0 =>
-- .
SBKEY_BODY0 : aliased HAL.UInt32;
-- .
USER_KEK_BODY0 : aliased HAL.UInt32;
-- .
UDS_BODY0 : aliased HAL.UInt32;
-- .
PRINCE_REGION0_BODY0 : aliased HAL.UInt32;
-- .
PRINCE_REGION1_BODY0 : aliased HAL.UInt32;
-- .
PRINCE_REGION2_BODY0 : aliased HAL.UInt32;
when Key_Code2 =>
-- .
SBKEY_KEY_CODE2 : aliased HAL.UInt32;
-- .
USER_KEK_KEY_CODE2 : aliased HAL.UInt32;
-- .
UDS_KEY_CODE2 : aliased HAL.UInt32;
-- .
PRINCE_REGION0_KEY_CODE2 : aliased HAL.UInt32;
-- .
PRINCE_REGION1_KEY_CODE2 : aliased HAL.UInt32;
-- .
PRINCE_REGION2_KEY_CODE2 : aliased HAL.UInt32;
when Body1 =>
-- .
SBKEY_BODY1 : aliased HAL.UInt32;
-- .
USER_KEK_BODY1 : aliased HAL.UInt32;
-- .
UDS_BODY1 : aliased HAL.UInt32;
-- .
PRINCE_REGION0_BODY1 : aliased HAL.UInt32;
-- .
PRINCE_REGION1_BODY1 : aliased HAL.UInt32;
-- .
PRINCE_REGION2_BODY1 : aliased HAL.UInt32;
when Key_Code3 =>
-- .
SBKEY_KEY_CODE3 : aliased HAL.UInt32;
-- .
USER_KEK_KEY_CODE3 : aliased HAL.UInt32;
-- .
UDS_KEY_CODE3 : aliased HAL.UInt32;
-- .
PRINCE_REGION0_KEY_CODE3 : aliased HAL.UInt32;
-- .
PRINCE_REGION1_KEY_CODE3 : aliased HAL.UInt32;
-- .
PRINCE_REGION2_KEY_CODE3 : aliased HAL.UInt32;
when Body2 =>
-- .
SBKEY_BODY2 : aliased HAL.UInt32;
-- .
USER_KEK_BODY2 : aliased HAL.UInt32;
-- .
UDS_BODY2 : aliased HAL.UInt32;
-- .
PRINCE_REGION0_BODY2 : aliased HAL.UInt32;
-- .
PRINCE_REGION1_BODY2 : aliased HAL.UInt32;
-- .
PRINCE_REGION2_BODY2 : aliased HAL.UInt32;
when Key_Code4 =>
-- .
SBKEY_KEY_CODE4 : aliased HAL.UInt32;
-- .
USER_KEK_KEY_CODE4 : aliased HAL.UInt32;
-- .
UDS_KEY_CODE4 : aliased HAL.UInt32;
-- .
PRINCE_REGION0_KEY_CODE4 : aliased HAL.UInt32;
-- .
PRINCE_REGION1_KEY_CODE4 : aliased HAL.UInt32;
-- .
PRINCE_REGION2_KEY_CODE4 : aliased HAL.UInt32;
when Body3 =>
-- .
SBKEY_BODY3 : aliased HAL.UInt32;
-- .
USER_KEK_BODY3 : aliased HAL.UInt32;
-- .
UDS_BODY3 : aliased HAL.UInt32;
-- .
PRINCE_REGION0_BODY3 : aliased HAL.UInt32;
-- .
PRINCE_REGION1_BODY3 : aliased HAL.UInt32;
-- .
PRINCE_REGION2_BODY3 : aliased HAL.UInt32;
when Key_Code5 =>
-- .
SBKEY_KEY_CODE5 : aliased HAL.UInt32;
-- .
USER_KEK_KEY_CODE5 : aliased HAL.UInt32;
-- .
UDS_KEY_CODE5 : aliased HAL.UInt32;
-- .
PRINCE_REGION0_KEY_CODE5 : aliased HAL.UInt32;
-- .
PRINCE_REGION1_KEY_CODE5 : aliased HAL.UInt32;
-- .
PRINCE_REGION2_KEY_CODE5 : aliased HAL.UInt32;
when Body4 =>
-- .
SBKEY_BODY4 : aliased HAL.UInt32;
-- .
USER_KEK_BODY4 : aliased HAL.UInt32;
-- .
UDS_BODY4 : aliased HAL.UInt32;
-- .
PRINCE_REGION0_BODY4 : aliased HAL.UInt32;
-- .
PRINCE_REGION1_BODY4 : aliased HAL.UInt32;
-- .
PRINCE_REGION2_BODY4 : aliased HAL.UInt32;
when Key_Code6 =>
-- .
SBKEY_KEY_CODE6 : aliased HAL.UInt32;
-- .
USER_KEK_KEY_CODE6 : aliased HAL.UInt32;
-- .
UDS_KEY_CODE6 : aliased HAL.UInt32;
-- .
PRINCE_REGION0_KEY_CODE6 : aliased HAL.UInt32;
-- .
PRINCE_REGION1_KEY_CODE6 : aliased HAL.UInt32;
-- .
PRINCE_REGION2_KEY_CODE6 : aliased HAL.UInt32;
when Body5 =>
-- .
SBKEY_BODY5 : aliased HAL.UInt32;
-- .
USER_KEK_BODY5 : aliased HAL.UInt32;
-- .
UDS_BODY5 : aliased HAL.UInt32;
-- .
PRINCE_REGION0_BODY5 : aliased HAL.UInt32;
-- .
PRINCE_REGION1_BODY5 : aliased HAL.UInt32;
-- .
PRINCE_REGION2_BODY5 : aliased HAL.UInt32;
when Key_Code7 =>
-- .
SBKEY_KEY_CODE7 : aliased HAL.UInt32;
-- .
USER_KEK_KEY_CODE7 : aliased HAL.UInt32;
-- .
UDS_KEY_CODE7 : aliased HAL.UInt32;
-- .
PRINCE_REGION0_KEY_CODE7 : aliased HAL.UInt32;
-- .
PRINCE_REGION1_KEY_CODE7 : aliased HAL.UInt32;
-- .
PRINCE_REGION2_KEY_CODE7 : aliased HAL.UInt32;
when Body6 =>
-- .
SBKEY_BODY6 : aliased HAL.UInt32;
-- .
USER_KEK_BODY6 : aliased HAL.UInt32;
-- .
UDS_BODY6 : aliased HAL.UInt32;
-- .
PRINCE_REGION0_BODY6 : aliased HAL.UInt32;
-- .
PRINCE_REGION1_BODY6 : aliased HAL.UInt32;
-- .
PRINCE_REGION2_BODY6 : aliased HAL.UInt32;
when Key_Code8 =>
-- .
SBKEY_KEY_CODE8 : aliased HAL.UInt32;
-- .
USER_KEK_KEY_CODE8 : aliased HAL.UInt32;
-- .
UDS_KEY_CODE8 : aliased HAL.UInt32;
-- .
PRINCE_REGION0_KEY_CODE8 : aliased HAL.UInt32;
-- .
PRINCE_REGION1_KEY_CODE8 : aliased HAL.UInt32;
-- .
PRINCE_REGION2_KEY_CODE8 : aliased HAL.UInt32;
when Body7 =>
-- .
SBKEY_BODY7 : aliased HAL.UInt32;
-- .
USER_KEK_BODY7 : aliased HAL.UInt32;
-- .
UDS_BODY7 : aliased HAL.UInt32;
-- .
PRINCE_REGION0_BODY7 : aliased HAL.UInt32;
-- .
PRINCE_REGION1_BODY7 : aliased HAL.UInt32;
-- .
PRINCE_REGION2_BODY7 : aliased HAL.UInt32;
when Key_Code9 =>
-- .
SBKEY_KEY_CODE9 : aliased HAL.UInt32;
-- .
USER_KEK_KEY_CODE9 : aliased HAL.UInt32;
-- .
UDS_KEY_CODE9 : aliased HAL.UInt32;
-- .
PRINCE_REGION0_KEY_CODE9 : aliased HAL.UInt32;
-- .
PRINCE_REGION1_KEY_CODE9 : aliased HAL.UInt32;
-- .
PRINCE_REGION2_KEY_CODE9 : aliased HAL.UInt32;
when Body8 =>
-- .
SBKEY_BODY8 : aliased HAL.UInt32;
-- .
USER_KEK_BODY8 : aliased HAL.UInt32;
-- .
UDS_BODY8 : aliased HAL.UInt32;
-- .
PRINCE_REGION0_BODY8 : aliased HAL.UInt32;
-- .
PRINCE_REGION1_BODY8 : aliased HAL.UInt32;
-- .
PRINCE_REGION2_BODY8 : aliased HAL.UInt32;
when Key_Code10 =>
-- .
SBKEY_KEY_CODE10 : aliased HAL.UInt32;
-- .
USER_KEK_KEY_CODE10 : aliased HAL.UInt32;
-- .
UDS_KEY_CODE10 : aliased HAL.UInt32;
-- .
PRINCE_REGION0_KEY_CODE10 : aliased HAL.UInt32;
-- .
PRINCE_REGION1_KEY_CODE10 : aliased HAL.UInt32;
-- .
PRINCE_REGION2_KEY_CODE10 : aliased HAL.UInt32;
when Body9 =>
-- .
SBKEY_BODY9 : aliased HAL.UInt32;
-- .
USER_KEK_BODY9 : aliased HAL.UInt32;
-- .
UDS_BODY9 : aliased HAL.UInt32;
-- .
PRINCE_REGION0_BODY9 : aliased HAL.UInt32;
-- .
PRINCE_REGION1_BODY9 : aliased HAL.UInt32;
-- .
PRINCE_REGION2_BODY9 : aliased HAL.UInt32;
when Key_Code11 =>
-- .
SBKEY_KEY_CODE11 : aliased HAL.UInt32;
-- .
USER_KEK_KEY_CODE11 : aliased HAL.UInt32;
-- .
UDS_KEY_CODE11 : aliased HAL.UInt32;
-- .
PRINCE_REGION0_KEY_CODE11 : aliased HAL.UInt32;
-- .
PRINCE_REGION1_KEY_CODE11 : aliased HAL.UInt32;
-- .
PRINCE_REGION2_KEY_CODE11 : aliased HAL.UInt32;
when Body10 =>
-- .
SBKEY_BODY10 : aliased HAL.UInt32;
-- .
USER_KEK_BODY10 : aliased HAL.UInt32;
-- .
UDS_BODY10 : aliased HAL.UInt32;
-- .
PRINCE_REGION0_BODY10 : aliased HAL.UInt32;
-- .
PRINCE_REGION1_BODY10 : aliased HAL.UInt32;
-- .
PRINCE_REGION2_BODY10 : aliased HAL.UInt32;
when Key_Code12 =>
-- .
SBKEY_KEY_CODE12 : aliased HAL.UInt32;
-- .
USER_KEK_KEY_CODE12 : aliased HAL.UInt32;
-- .
UDS_KEY_CODE12 : aliased HAL.UInt32;
-- .
PRINCE_REGION0_KEY_CODE12 : aliased HAL.UInt32;
-- .
PRINCE_REGION1_KEY_CODE12 : aliased HAL.UInt32;
-- .
PRINCE_REGION2_KEY_CODE12 : aliased HAL.UInt32;
when Body11 =>
-- .
SBKEY_BODY11 : aliased HAL.UInt32;
-- .
USER_KEK_BODY11 : aliased HAL.UInt32;
-- .
UDS_BODY11 : aliased HAL.UInt32;
-- .
PRINCE_REGION0_BODY11 : aliased HAL.UInt32;
-- .
PRINCE_REGION1_BODY11 : aliased HAL.UInt32;
-- .
PRINCE_REGION2_BODY11 : aliased HAL.UInt32;
when Key_Code13 =>
-- .
SBKEY_KEY_CODE13 : aliased HAL.UInt32;
-- .
USER_KEK_KEY_CODE13 : aliased HAL.UInt32;
-- .
UDS_KEY_CODE13 : aliased HAL.UInt32;
-- .
PRINCE_REGION0_KEY_CODE13 : aliased HAL.UInt32;
-- .
PRINCE_REGION1_KEY_CODE13 : aliased HAL.UInt32;
-- .
PRINCE_REGION2_KEY_CODE13 : aliased HAL.UInt32;
end case;
end record
with Unchecked_Union, Volatile;
for FLASH_KEY_STORE_Peripheral use record
HEADER at 16#0# range 0 .. 31;
puf_discharge_time_in_ms at 16#4# range 0 .. 31;
ACTIVATION_CODE at 16#8# range 0 .. 9535;
SBKEY_HEADER0 at 16#4B0# range 0 .. 31;
USER_KEK_HEADER0 at 16#4E8# range 0 .. 31;
UDS_HEADER0 at 16#520# range 0 .. 31;
PRINCE_REGION0_HEADER0 at 16#558# range 0 .. 31;
PRINCE_REGION1_HEADER0 at 16#590# range 0 .. 31;
PRINCE_REGION2_HEADER0 at 16#5C8# range 0 .. 31;
SBKEY_KEY_CODE0 at 16#4B0# range 0 .. 31;
USER_KEK_KEY_CODE0 at 16#4E8# range 0 .. 31;
UDS_KEY_CODE0 at 16#520# range 0 .. 31;
PRINCE_REGION0_KEY_CODE0 at 16#558# range 0 .. 31;
PRINCE_REGION1_KEY_CODE0 at 16#590# range 0 .. 31;
PRINCE_REGION2_KEY_CODE0 at 16#5C8# range 0 .. 31;
SBKEY_HEADER1 at 16#4B4# range 0 .. 31;
USER_KEK_HEADER1 at 16#4EC# range 0 .. 31;
UDS_HEADER1 at 16#524# range 0 .. 31;
PRINCE_REGION0_HEADER1 at 16#55C# range 0 .. 31;
PRINCE_REGION1_HEADER1 at 16#594# range 0 .. 31;
PRINCE_REGION2_HEADER1 at 16#5CC# range 0 .. 31;
SBKEY_KEY_CODE1 at 16#4B4# range 0 .. 31;
USER_KEK_KEY_CODE1 at 16#4EC# range 0 .. 31;
UDS_KEY_CODE1 at 16#524# range 0 .. 31;
PRINCE_REGION0_KEY_CODE1 at 16#55C# range 0 .. 31;
PRINCE_REGION1_KEY_CODE1 at 16#594# range 0 .. 31;
PRINCE_REGION2_KEY_CODE1 at 16#5CC# range 0 .. 31;
SBKEY_BODY0 at 16#4B8# range 0 .. 31;
USER_KEK_BODY0 at 16#4F0# range 0 .. 31;
UDS_BODY0 at 16#528# range 0 .. 31;
PRINCE_REGION0_BODY0 at 16#560# range 0 .. 31;
PRINCE_REGION1_BODY0 at 16#598# range 0 .. 31;
PRINCE_REGION2_BODY0 at 16#5D0# range 0 .. 31;
SBKEY_KEY_CODE2 at 16#4B8# range 0 .. 31;
USER_KEK_KEY_CODE2 at 16#4F0# range 0 .. 31;
UDS_KEY_CODE2 at 16#528# range 0 .. 31;
PRINCE_REGION0_KEY_CODE2 at 16#560# range 0 .. 31;
PRINCE_REGION1_KEY_CODE2 at 16#598# range 0 .. 31;
PRINCE_REGION2_KEY_CODE2 at 16#5D0# range 0 .. 31;
SBKEY_BODY1 at 16#4BC# range 0 .. 31;
USER_KEK_BODY1 at 16#4F4# range 0 .. 31;
UDS_BODY1 at 16#52C# range 0 .. 31;
PRINCE_REGION0_BODY1 at 16#564# range 0 .. 31;
PRINCE_REGION1_BODY1 at 16#59C# range 0 .. 31;
PRINCE_REGION2_BODY1 at 16#5D4# range 0 .. 31;
SBKEY_KEY_CODE3 at 16#4BC# range 0 .. 31;
USER_KEK_KEY_CODE3 at 16#4F4# range 0 .. 31;
UDS_KEY_CODE3 at 16#52C# range 0 .. 31;
PRINCE_REGION0_KEY_CODE3 at 16#564# range 0 .. 31;
PRINCE_REGION1_KEY_CODE3 at 16#59C# range 0 .. 31;
PRINCE_REGION2_KEY_CODE3 at 16#5D4# range 0 .. 31;
SBKEY_BODY2 at 16#4C0# range 0 .. 31;
USER_KEK_BODY2 at 16#4F8# range 0 .. 31;
UDS_BODY2 at 16#530# range 0 .. 31;
PRINCE_REGION0_BODY2 at 16#568# range 0 .. 31;
PRINCE_REGION1_BODY2 at 16#5A0# range 0 .. 31;
PRINCE_REGION2_BODY2 at 16#5D8# range 0 .. 31;
SBKEY_KEY_CODE4 at 16#4C0# range 0 .. 31;
USER_KEK_KEY_CODE4 at 16#4F8# range 0 .. 31;
UDS_KEY_CODE4 at 16#530# range 0 .. 31;
PRINCE_REGION0_KEY_CODE4 at 16#568# range 0 .. 31;
PRINCE_REGION1_KEY_CODE4 at 16#5A0# range 0 .. 31;
PRINCE_REGION2_KEY_CODE4 at 16#5D8# range 0 .. 31;
SBKEY_BODY3 at 16#4C4# range 0 .. 31;
USER_KEK_BODY3 at 16#4FC# range 0 .. 31;
UDS_BODY3 at 16#534# range 0 .. 31;
PRINCE_REGION0_BODY3 at 16#56C# range 0 .. 31;
PRINCE_REGION1_BODY3 at 16#5A4# range 0 .. 31;
PRINCE_REGION2_BODY3 at 16#5DC# range 0 .. 31;
SBKEY_KEY_CODE5 at 16#4C4# range 0 .. 31;
USER_KEK_KEY_CODE5 at 16#4FC# range 0 .. 31;
UDS_KEY_CODE5 at 16#534# range 0 .. 31;
PRINCE_REGION0_KEY_CODE5 at 16#56C# range 0 .. 31;
PRINCE_REGION1_KEY_CODE5 at 16#5A4# range 0 .. 31;
PRINCE_REGION2_KEY_CODE5 at 16#5DC# range 0 .. 31;
SBKEY_BODY4 at 16#4C8# range 0 .. 31;
USER_KEK_BODY4 at 16#500# range 0 .. 31;
UDS_BODY4 at 16#538# range 0 .. 31;
PRINCE_REGION0_BODY4 at 16#570# range 0 .. 31;
PRINCE_REGION1_BODY4 at 16#5A8# range 0 .. 31;
PRINCE_REGION2_BODY4 at 16#5E0# range 0 .. 31;
SBKEY_KEY_CODE6 at 16#4C8# range 0 .. 31;
USER_KEK_KEY_CODE6 at 16#500# range 0 .. 31;
UDS_KEY_CODE6 at 16#538# range 0 .. 31;
PRINCE_REGION0_KEY_CODE6 at 16#570# range 0 .. 31;
PRINCE_REGION1_KEY_CODE6 at 16#5A8# range 0 .. 31;
PRINCE_REGION2_KEY_CODE6 at 16#5E0# range 0 .. 31;
SBKEY_BODY5 at 16#4CC# range 0 .. 31;
USER_KEK_BODY5 at 16#504# range 0 .. 31;
UDS_BODY5 at 16#53C# range 0 .. 31;
PRINCE_REGION0_BODY5 at 16#574# range 0 .. 31;
PRINCE_REGION1_BODY5 at 16#5AC# range 0 .. 31;
PRINCE_REGION2_BODY5 at 16#5E4# range 0 .. 31;
SBKEY_KEY_CODE7 at 16#4CC# range 0 .. 31;
USER_KEK_KEY_CODE7 at 16#504# range 0 .. 31;
UDS_KEY_CODE7 at 16#53C# range 0 .. 31;
PRINCE_REGION0_KEY_CODE7 at 16#574# range 0 .. 31;
PRINCE_REGION1_KEY_CODE7 at 16#5AC# range 0 .. 31;
PRINCE_REGION2_KEY_CODE7 at 16#5E4# range 0 .. 31;
SBKEY_BODY6 at 16#4D0# range 0 .. 31;
USER_KEK_BODY6 at 16#508# range 0 .. 31;
UDS_BODY6 at 16#540# range 0 .. 31;
PRINCE_REGION0_BODY6 at 16#578# range 0 .. 31;
PRINCE_REGION1_BODY6 at 16#5B0# range 0 .. 31;
PRINCE_REGION2_BODY6 at 16#5E8# range 0 .. 31;
SBKEY_KEY_CODE8 at 16#4D0# range 0 .. 31;
USER_KEK_KEY_CODE8 at 16#508# range 0 .. 31;
UDS_KEY_CODE8 at 16#540# range 0 .. 31;
PRINCE_REGION0_KEY_CODE8 at 16#578# range 0 .. 31;
PRINCE_REGION1_KEY_CODE8 at 16#5B0# range 0 .. 31;
PRINCE_REGION2_KEY_CODE8 at 16#5E8# range 0 .. 31;
SBKEY_BODY7 at 16#4D4# range 0 .. 31;
USER_KEK_BODY7 at 16#50C# range 0 .. 31;
UDS_BODY7 at 16#544# range 0 .. 31;
PRINCE_REGION0_BODY7 at 16#57C# range 0 .. 31;
PRINCE_REGION1_BODY7 at 16#5B4# range 0 .. 31;
PRINCE_REGION2_BODY7 at 16#5EC# range 0 .. 31;
SBKEY_KEY_CODE9 at 16#4D4# range 0 .. 31;
USER_KEK_KEY_CODE9 at 16#50C# range 0 .. 31;
UDS_KEY_CODE9 at 16#544# range 0 .. 31;
PRINCE_REGION0_KEY_CODE9 at 16#57C# range 0 .. 31;
PRINCE_REGION1_KEY_CODE9 at 16#5B4# range 0 .. 31;
PRINCE_REGION2_KEY_CODE9 at 16#5EC# range 0 .. 31;
SBKEY_BODY8 at 16#4D8# range 0 .. 31;
USER_KEK_BODY8 at 16#510# range 0 .. 31;
UDS_BODY8 at 16#548# range 0 .. 31;
PRINCE_REGION0_BODY8 at 16#580# range 0 .. 31;
PRINCE_REGION1_BODY8 at 16#5B8# range 0 .. 31;
PRINCE_REGION2_BODY8 at 16#5F0# range 0 .. 31;
SBKEY_KEY_CODE10 at 16#4D8# range 0 .. 31;
USER_KEK_KEY_CODE10 at 16#510# range 0 .. 31;
UDS_KEY_CODE10 at 16#548# range 0 .. 31;
PRINCE_REGION0_KEY_CODE10 at 16#580# range 0 .. 31;
PRINCE_REGION1_KEY_CODE10 at 16#5B8# range 0 .. 31;
PRINCE_REGION2_KEY_CODE10 at 16#5F0# range 0 .. 31;
SBKEY_BODY9 at 16#4DC# range 0 .. 31;
USER_KEK_BODY9 at 16#514# range 0 .. 31;
UDS_BODY9 at 16#54C# range 0 .. 31;
PRINCE_REGION0_BODY9 at 16#584# range 0 .. 31;
PRINCE_REGION1_BODY9 at 16#5BC# range 0 .. 31;
PRINCE_REGION2_BODY9 at 16#5F4# range 0 .. 31;
SBKEY_KEY_CODE11 at 16#4DC# range 0 .. 31;
USER_KEK_KEY_CODE11 at 16#514# range 0 .. 31;
UDS_KEY_CODE11 at 16#54C# range 0 .. 31;
PRINCE_REGION0_KEY_CODE11 at 16#584# range 0 .. 31;
PRINCE_REGION1_KEY_CODE11 at 16#5BC# range 0 .. 31;
PRINCE_REGION2_KEY_CODE11 at 16#5F4# range 0 .. 31;
SBKEY_BODY10 at 16#4E0# range 0 .. 31;
USER_KEK_BODY10 at 16#518# range 0 .. 31;
UDS_BODY10 at 16#550# range 0 .. 31;
PRINCE_REGION0_BODY10 at 16#588# range 0 .. 31;
PRINCE_REGION1_BODY10 at 16#5C0# range 0 .. 31;
PRINCE_REGION2_BODY10 at 16#5F8# range 0 .. 31;
SBKEY_KEY_CODE12 at 16#4E0# range 0 .. 31;
USER_KEK_KEY_CODE12 at 16#518# range 0 .. 31;
UDS_KEY_CODE12 at 16#550# range 0 .. 31;
PRINCE_REGION0_KEY_CODE12 at 16#588# range 0 .. 31;
PRINCE_REGION1_KEY_CODE12 at 16#5C0# range 0 .. 31;
PRINCE_REGION2_KEY_CODE12 at 16#5F8# range 0 .. 31;
SBKEY_BODY11 at 16#4E4# range 0 .. 31;
USER_KEK_BODY11 at 16#51C# range 0 .. 31;
UDS_BODY11 at 16#554# range 0 .. 31;
PRINCE_REGION0_BODY11 at 16#58C# range 0 .. 31;
PRINCE_REGION1_BODY11 at 16#5C4# range 0 .. 31;
PRINCE_REGION2_BODY11 at 16#5FC# range 0 .. 31;
SBKEY_KEY_CODE13 at 16#4E4# range 0 .. 31;
USER_KEK_KEY_CODE13 at 16#51C# range 0 .. 31;
UDS_KEY_CODE13 at 16#554# range 0 .. 31;
PRINCE_REGION0_KEY_CODE13 at 16#58C# range 0 .. 31;
PRINCE_REGION1_KEY_CODE13 at 16#5C4# range 0 .. 31;
PRINCE_REGION2_KEY_CODE13 at 16#5FC# range 0 .. 31;
end record;
-- FLASH_KEY_STORE
FLASH_KEY_STORE_Periph : aliased FLASH_KEY_STORE_Peripheral
with Import, Address => System'To_Address (16#9E600#);
end NXP_SVD.FLASH_KEY_STORE;
| 38.153846 | 77 | 0.54107 |
20a7a7db5d9e8d9d726f82f66cdf02a27164ec40 | 65,795 | adb | Ada | gcc-gcc-7_3_0-release/gcc/ada/exp_strm.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/exp_strm.adb | best08618/asylo | 5a520a9f5c461ede0f32acc284017b737a43898c | [
"Apache-2.0"
] | null | null | null | gcc-gcc-7_3_0-release/gcc/ada/exp_strm.adb | best08618/asylo | 5a520a9f5c461ede0f32acc284017b737a43898c | [
"Apache-2.0"
] | 2 | 2020-07-27T00:22:36.000Z | 2021-04-01T09:41:02.000Z | ------------------------------------------------------------------------------
-- --
-- GNAT COMPILER COMPONENTS --
-- --
-- E X P _ S T R M --
-- --
-- B o d y --
-- --
-- Copyright (C) 1992-2016, 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. 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 COPYING3. If not, go to --
-- http://www.gnu.org/licenses for a complete copy of the license. --
-- --
-- GNAT was originally developed by the GNAT team at New York University. --
-- Extensive contributions were provided by Ada Core Technologies Inc. --
-- --
------------------------------------------------------------------------------
with Atree; use Atree;
with Einfo; use Einfo;
with Elists; use Elists;
with Exp_Util; use Exp_Util;
with Namet; use Namet;
with Nlists; use Nlists;
with Nmake; use Nmake;
with Rtsfind; use Rtsfind;
with Sem_Aux; use Sem_Aux;
with Sem_Util; use Sem_Util;
with Sinfo; use Sinfo;
with Snames; use Snames;
with Stand; use Stand;
with Tbuild; use Tbuild;
with Ttypes; use Ttypes;
with Uintp; use Uintp;
package body Exp_Strm is
-----------------------
-- Local Subprograms --
-----------------------
procedure Build_Array_Read_Write_Procedure
(Nod : Node_Id;
Typ : Entity_Id;
Decl : out Node_Id;
Pnam : Entity_Id;
Nam : Name_Id);
-- Common routine shared to build either an array Read procedure or an
-- array Write procedure, Nam is Name_Read or Name_Write to select which.
-- Pnam is the defining identifier for the constructed procedure. The
-- other parameters are as for Build_Array_Read_Procedure except that
-- the first parameter Nod supplies the Sloc to be used to generate code.
procedure Build_Record_Read_Write_Procedure
(Loc : Source_Ptr;
Typ : Entity_Id;
Decl : out Node_Id;
Pnam : Entity_Id;
Nam : Name_Id);
-- Common routine shared to build a record Read Write procedure, Nam
-- is Name_Read or Name_Write to select which. Pnam is the defining
-- identifier for the constructed procedure. The other parameters are
-- as for Build_Record_Read_Procedure.
procedure Build_Stream_Function
(Loc : Source_Ptr;
Typ : Entity_Id;
Decl : out Node_Id;
Fnam : Entity_Id;
Decls : List_Id;
Stms : List_Id);
-- Called to build an array or record stream function. The first three
-- arguments are the same as Build_Record_Or_Elementary_Input_Function.
-- Decls and Stms are the declarations and statements for the body and
-- The parameter Fnam is the name of the constructed function.
function Has_Stream_Standard_Rep (U_Type : Entity_Id) return Boolean;
-- This function is used to test the type U_Type, to determine if it has
-- a standard representation from a streaming point of view. Standard means
-- that it has a standard representation (e.g. no enumeration rep clause),
-- and the size of the root type is the same as the streaming size (which
-- is defined as value specified by a Stream_Size clause if present, or
-- the Esize of U_Type if not).
function Make_Stream_Subprogram_Name
(Loc : Source_Ptr;
Typ : Entity_Id;
Nam : TSS_Name_Type) return Entity_Id;
-- Return the entity that identifies the stream subprogram for type Typ
-- that is identified by the given Nam. This procedure deals with the
-- difference between tagged types (where a single subprogram associated
-- with the type is generated) and all other cases (where a subprogram
-- is generated at the point of the stream attribute reference). The
-- Loc parameter is used as the Sloc of the created entity.
function Stream_Base_Type (E : Entity_Id) return Entity_Id;
-- Stream attributes work on the basis of the base type except for the
-- array case. For the array case, we do not go to the base type, but
-- to the first subtype if it is constrained. This avoids problems with
-- incorrect conversions in the packed array case. Stream_Base_Type is
-- exactly this function (returns the base type, unless we have an array
-- type whose first subtype is constrained, in which case it returns the
-- first subtype).
--------------------------------
-- Build_Array_Input_Function --
--------------------------------
-- The function we build looks like
-- function typSI[_nnn] (S : access RST) return Typ is
-- L1 : constant Index_Type_1 := Index_Type_1'Input (S);
-- H1 : constant Index_Type_1 := Index_Type_1'Input (S);
-- L2 : constant Index_Type_2 := Index_Type_2'Input (S);
-- H2 : constant Index_Type_2 := Index_Type_2'Input (S);
-- ..
-- Ln : constant Index_Type_n := Index_Type_n'Input (S);
-- Hn : constant Index_Type_n := Index_Type_n'Input (S);
--
-- V : Typ'Base (L1 .. H1, L2 .. H2, ... Ln .. Hn)
-- begin
-- Typ'Read (S, V);
-- return V;
-- end typSI[_nnn]
-- Note: the suffix [_nnn] is present for untagged types, where we generate
-- a local subprogram at the point of the occurrence of the attribute
-- reference, so the name must be unique.
procedure Build_Array_Input_Function
(Loc : Source_Ptr;
Typ : Entity_Id;
Decl : out Node_Id;
Fnam : out Entity_Id)
is
Dim : constant Pos := Number_Dimensions (Typ);
Lnam : Name_Id;
Hnam : Name_Id;
Decls : List_Id;
Ranges : List_Id;
Stms : List_Id;
Rstmt : Node_Id;
Indx : Node_Id;
Odecl : Node_Id;
begin
Decls := New_List;
Ranges := New_List;
Indx := First_Index (Typ);
for J in 1 .. Dim loop
Lnam := New_External_Name ('L', J);
Hnam := New_External_Name ('H', J);
Append_To (Decls,
Make_Object_Declaration (Loc,
Defining_Identifier => Make_Defining_Identifier (Loc, Lnam),
Constant_Present => True,
Object_Definition => New_Occurrence_Of (Etype (Indx), Loc),
Expression =>
Make_Attribute_Reference (Loc,
Prefix =>
New_Occurrence_Of (Stream_Base_Type (Etype (Indx)), Loc),
Attribute_Name => Name_Input,
Expressions => New_List (Make_Identifier (Loc, Name_S)))));
Append_To (Decls,
Make_Object_Declaration (Loc,
Defining_Identifier => Make_Defining_Identifier (Loc, Hnam),
Constant_Present => True,
Object_Definition =>
New_Occurrence_Of (Stream_Base_Type (Etype (Indx)), Loc),
Expression =>
Make_Attribute_Reference (Loc,
Prefix =>
New_Occurrence_Of (Stream_Base_Type (Etype (Indx)), Loc),
Attribute_Name => Name_Input,
Expressions => New_List (Make_Identifier (Loc, Name_S)))));
Append_To (Ranges,
Make_Range (Loc,
Low_Bound => Make_Identifier (Loc, Lnam),
High_Bound => Make_Identifier (Loc, Hnam)));
Next_Index (Indx);
end loop;
-- If the type is constrained, use it directly. Otherwise build a
-- subtype indication with the proper bounds.
if Is_Constrained (Typ) then
Odecl :=
Make_Object_Declaration (Loc,
Defining_Identifier => Make_Defining_Identifier (Loc, Name_V),
Object_Definition => New_Occurrence_Of (Typ, Loc));
else
Odecl :=
Make_Object_Declaration (Loc,
Defining_Identifier => Make_Defining_Identifier (Loc, Name_V),
Object_Definition =>
Make_Subtype_Indication (Loc,
Subtype_Mark =>
New_Occurrence_Of (Stream_Base_Type (Typ), Loc),
Constraint =>
Make_Index_Or_Discriminant_Constraint (Loc, Ranges)));
end if;
Rstmt :=
Make_Attribute_Reference (Loc,
Prefix => New_Occurrence_Of (Typ, Loc),
Attribute_Name => Name_Read,
Expressions => New_List (
Make_Identifier (Loc, Name_S),
Make_Identifier (Loc, Name_V)));
Stms := New_List (
Make_Extended_Return_Statement (Loc,
Return_Object_Declarations => New_List (Odecl),
Handled_Statement_Sequence =>
Make_Handled_Sequence_Of_Statements (Loc, New_List (Rstmt))));
Fnam :=
Make_Defining_Identifier (Loc,
Chars => Make_TSS_Name_Local (Typ, TSS_Stream_Input));
Build_Stream_Function (Loc, Typ, Decl, Fnam, Decls, Stms);
end Build_Array_Input_Function;
----------------------------------
-- Build_Array_Output_Procedure --
----------------------------------
procedure Build_Array_Output_Procedure
(Loc : Source_Ptr;
Typ : Entity_Id;
Decl : out Node_Id;
Pnam : out Entity_Id)
is
Stms : List_Id;
Indx : Node_Id;
begin
-- Build series of statements to output bounds
Indx := First_Index (Typ);
Stms := New_List;
for J in 1 .. Number_Dimensions (Typ) loop
Append_To (Stms,
Make_Attribute_Reference (Loc,
Prefix =>
New_Occurrence_Of (Stream_Base_Type (Etype (Indx)), Loc),
Attribute_Name => Name_Write,
Expressions => New_List (
Make_Identifier (Loc, Name_S),
Make_Attribute_Reference (Loc,
Prefix => Make_Identifier (Loc, Name_V),
Attribute_Name => Name_First,
Expressions => New_List (
Make_Integer_Literal (Loc, J))))));
Append_To (Stms,
Make_Attribute_Reference (Loc,
Prefix =>
New_Occurrence_Of (Stream_Base_Type (Etype (Indx)), Loc),
Attribute_Name => Name_Write,
Expressions => New_List (
Make_Identifier (Loc, Name_S),
Make_Attribute_Reference (Loc,
Prefix => Make_Identifier (Loc, Name_V),
Attribute_Name => Name_Last,
Expressions => New_List (
Make_Integer_Literal (Loc, J))))));
Next_Index (Indx);
end loop;
-- Append Write attribute to write array elements
Append_To (Stms,
Make_Attribute_Reference (Loc,
Prefix => New_Occurrence_Of (Typ, Loc),
Attribute_Name => Name_Write,
Expressions => New_List (
Make_Identifier (Loc, Name_S),
Make_Identifier (Loc, Name_V))));
Pnam :=
Make_Defining_Identifier (Loc,
Chars => Make_TSS_Name_Local (Typ, TSS_Stream_Output));
Build_Stream_Procedure (Loc, Typ, Decl, Pnam, Stms, False);
end Build_Array_Output_Procedure;
--------------------------------
-- Build_Array_Read_Procedure --
--------------------------------
procedure Build_Array_Read_Procedure
(Nod : Node_Id;
Typ : Entity_Id;
Decl : out Node_Id;
Pnam : out Entity_Id)
is
Loc : constant Source_Ptr := Sloc (Nod);
begin
Pnam :=
Make_Defining_Identifier (Loc,
Chars => Make_TSS_Name_Local (Typ, TSS_Stream_Read));
Build_Array_Read_Write_Procedure (Nod, Typ, Decl, Pnam, Name_Read);
end Build_Array_Read_Procedure;
--------------------------------------
-- Build_Array_Read_Write_Procedure --
--------------------------------------
-- The form of the array read/write procedure is as follows:
-- procedure pnam (S : access RST, V : [out] Typ) is
-- begin
-- for L1 in V'Range (1) loop
-- for L2 in V'Range (2) loop
-- ...
-- for Ln in V'Range (n) loop
-- Component_Type'Read/Write (S, V (L1, L2, .. Ln));
-- end loop;
-- ..
-- end loop;
-- end loop
-- end pnam;
-- The out keyword for V is supplied in the Read case
procedure Build_Array_Read_Write_Procedure
(Nod : Node_Id;
Typ : Entity_Id;
Decl : out Node_Id;
Pnam : Entity_Id;
Nam : Name_Id)
is
Loc : constant Source_Ptr := Sloc (Nod);
Ndim : constant Pos := Number_Dimensions (Typ);
Ctyp : constant Entity_Id := Component_Type (Typ);
Stm : Node_Id;
Exl : List_Id;
RW : Entity_Id;
begin
-- First build the inner attribute call
Exl := New_List;
for J in 1 .. Ndim loop
Append_To (Exl, Make_Identifier (Loc, New_External_Name ('L', J)));
end loop;
Stm :=
Make_Attribute_Reference (Loc,
Prefix => New_Occurrence_Of (Stream_Base_Type (Ctyp), Loc),
Attribute_Name => Nam,
Expressions => New_List (
Make_Identifier (Loc, Name_S),
Make_Indexed_Component (Loc,
Prefix => Make_Identifier (Loc, Name_V),
Expressions => Exl)));
-- The corresponding stream attribute for the component type of the
-- array may be user-defined, and be frozen after the type for which
-- we are generating the stream subprogram. In that case, freeze the
-- stream attribute of the component type, whose declaration could not
-- generate any additional freezing actions in any case.
if Nam = Name_Read then
RW := TSS (Base_Type (Ctyp), TSS_Stream_Read);
else
RW := TSS (Base_Type (Ctyp), TSS_Stream_Write);
end if;
if Present (RW)
and then not Is_Frozen (RW)
then
Set_Is_Frozen (RW);
end if;
-- Now this is the big loop to wrap that statement up in a sequence
-- of loops. The first time around, Stm is the attribute call. The
-- second and subsequent times, Stm is an inner loop.
for J in 1 .. Ndim loop
Stm :=
Make_Implicit_Loop_Statement (Nod,
Iteration_Scheme =>
Make_Iteration_Scheme (Loc,
Loop_Parameter_Specification =>
Make_Loop_Parameter_Specification (Loc,
Defining_Identifier =>
Make_Defining_Identifier (Loc,
Chars => New_External_Name ('L', Ndim - J + 1)),
Discrete_Subtype_Definition =>
Make_Attribute_Reference (Loc,
Prefix => Make_Identifier (Loc, Name_V),
Attribute_Name => Name_Range,
Expressions => New_List (
Make_Integer_Literal (Loc, Ndim - J + 1))))),
Statements => New_List (Stm));
end loop;
Build_Stream_Procedure
(Loc, Typ, Decl, Pnam, New_List (Stm), Nam = Name_Read);
end Build_Array_Read_Write_Procedure;
---------------------------------
-- Build_Array_Write_Procedure --
---------------------------------
procedure Build_Array_Write_Procedure
(Nod : Node_Id;
Typ : Entity_Id;
Decl : out Node_Id;
Pnam : out Entity_Id)
is
Loc : constant Source_Ptr := Sloc (Nod);
begin
Pnam :=
Make_Defining_Identifier (Loc,
Chars => Make_TSS_Name_Local (Typ, TSS_Stream_Write));
Build_Array_Read_Write_Procedure (Nod, Typ, Decl, Pnam, Name_Write);
end Build_Array_Write_Procedure;
---------------------------------
-- Build_Elementary_Input_Call --
---------------------------------
function Build_Elementary_Input_Call (N : Node_Id) return Node_Id is
Loc : constant Source_Ptr := Sloc (N);
P_Type : constant Entity_Id := Entity (Prefix (N));
U_Type : constant Entity_Id := Underlying_Type (P_Type);
Rt_Type : constant Entity_Id := Root_Type (U_Type);
FST : constant Entity_Id := First_Subtype (U_Type);
Strm : constant Node_Id := First (Expressions (N));
Targ : constant Node_Id := Next (Strm);
P_Size : constant Uint := Get_Stream_Size (FST);
Res : Node_Id;
Lib_RE : RE_Id;
begin
-- Check first for Boolean and Character. These are enumeration types,
-- but we treat them specially, since they may require special handling
-- in the transfer protocol. However, this special handling only applies
-- if they have standard representation, otherwise they are treated like
-- any other enumeration type.
if Rt_Type = Standard_Boolean
and then Has_Stream_Standard_Rep (U_Type)
then
Lib_RE := RE_I_B;
elsif Rt_Type = Standard_Character
and then Has_Stream_Standard_Rep (U_Type)
then
Lib_RE := RE_I_C;
elsif Rt_Type = Standard_Wide_Character
and then Has_Stream_Standard_Rep (U_Type)
then
Lib_RE := RE_I_WC;
elsif Rt_Type = Standard_Wide_Wide_Character
and then Has_Stream_Standard_Rep (U_Type)
then
Lib_RE := RE_I_WWC;
-- Floating point types
elsif Is_Floating_Point_Type (U_Type) then
-- Question: should we use P_Size or Rt_Type to distinguish between
-- possible floating point types? If a non-standard size or a stream
-- size is specified, then we should certainly use the size. But if
-- we have two types the same (notably Short_Float_Size = Float_Size
-- which is close to universally true, and Long_Long_Float_Size =
-- Long_Float_Size, true on most targets except the x86), then we
-- would really rather use the root type, so that if people want to
-- fiddle with System.Stream_Attributes to get inter-target portable
-- streams, they get the size they expect. Consider in particular the
-- case of a stream written on an x86, with 96-bit Long_Long_Float
-- being read into a non-x86 target with 64 bit Long_Long_Float. A
-- special version of System.Stream_Attributes can deal with this
-- provided the proper type is always used.
-- To deal with these two requirements we add the special checks
-- on equal sizes and use the root type to distinguish.
if P_Size <= Standard_Short_Float_Size
and then (Standard_Short_Float_Size /= Standard_Float_Size
or else Rt_Type = Standard_Short_Float)
then
Lib_RE := RE_I_SF;
elsif P_Size <= Standard_Float_Size then
Lib_RE := RE_I_F;
elsif P_Size <= Standard_Long_Float_Size
and then (Standard_Long_Float_Size /= Standard_Long_Long_Float_Size
or else Rt_Type = Standard_Long_Float)
then
Lib_RE := RE_I_LF;
else
Lib_RE := RE_I_LLF;
end if;
-- Signed integer types. Also includes signed fixed-point types and
-- enumeration types with a signed representation.
-- Note on signed integer types. We do not consider types as signed for
-- this purpose if they have no negative numbers, or if they have biased
-- representation. The reason is that the value in either case basically
-- represents an unsigned value.
-- For example, consider:
-- type W is range 0 .. 2**32 - 1;
-- for W'Size use 32;
-- This is a signed type, but the representation is unsigned, and may
-- be outside the range of a 32-bit signed integer, so this must be
-- treated as 32-bit unsigned.
-- Similarly, if we have
-- type W is range -1 .. +254;
-- for W'Size use 8;
-- then the representation is unsigned
elsif not Is_Unsigned_Type (FST)
-- The following set of tests gets repeated many times, we should
-- have an abstraction defined ???
and then
(Is_Fixed_Point_Type (U_Type)
or else
Is_Enumeration_Type (U_Type)
or else
(Is_Signed_Integer_Type (U_Type)
and then not Has_Biased_Representation (FST)))
then
if P_Size <= Standard_Short_Short_Integer_Size then
Lib_RE := RE_I_SSI;
elsif P_Size <= Standard_Short_Integer_Size then
Lib_RE := RE_I_SI;
elsif P_Size <= Standard_Integer_Size then
Lib_RE := RE_I_I;
elsif P_Size <= Standard_Long_Integer_Size then
Lib_RE := RE_I_LI;
else
Lib_RE := RE_I_LLI;
end if;
-- Unsigned integer types, also includes unsigned fixed-point types
-- and enumeration types with an unsigned representation (note that
-- we know they are unsigned because we already tested for signed).
-- Also includes signed integer types that are unsigned in the sense
-- that they do not include negative numbers. See above for details.
elsif Is_Modular_Integer_Type (U_Type)
or else Is_Fixed_Point_Type (U_Type)
or else Is_Enumeration_Type (U_Type)
or else Is_Signed_Integer_Type (U_Type)
then
if P_Size <= Standard_Short_Short_Integer_Size then
Lib_RE := RE_I_SSU;
elsif P_Size <= Standard_Short_Integer_Size then
Lib_RE := RE_I_SU;
elsif P_Size <= Standard_Integer_Size then
Lib_RE := RE_I_U;
elsif P_Size <= Standard_Long_Integer_Size then
Lib_RE := RE_I_LU;
else
Lib_RE := RE_I_LLU;
end if;
else pragma Assert (Is_Access_Type (U_Type));
if P_Size > System_Address_Size then
Lib_RE := RE_I_AD;
else
Lib_RE := RE_I_AS;
end if;
end if;
-- Call the function, and do an unchecked conversion of the result
-- to the actual type of the prefix. If the target is a discriminant,
-- and we are in the body of the default implementation of a 'Read
-- attribute, set target type to force a constraint check (13.13.2(35)).
-- If the type of the discriminant is currently private, add another
-- unchecked conversion from the full view.
if Nkind (Targ) = N_Identifier
and then Is_Internal_Name (Chars (Targ))
and then Is_TSS (Scope (Entity (Targ)), TSS_Stream_Read)
then
Res :=
Unchecked_Convert_To (Base_Type (U_Type),
Make_Function_Call (Loc,
Name => New_Occurrence_Of (RTE (Lib_RE), Loc),
Parameter_Associations => New_List (
Relocate_Node (Strm))));
Set_Do_Range_Check (Res);
if Base_Type (P_Type) /= Base_Type (U_Type) then
Res := Unchecked_Convert_To (Base_Type (P_Type), Res);
end if;
return Res;
else
Res :=
Make_Function_Call (Loc,
Name => New_Occurrence_Of (RTE (Lib_RE), Loc),
Parameter_Associations => New_List (
Relocate_Node (Strm)));
-- Now convert to the base type if we do not have a biased type. Note
-- that we did not do this in some older versions, and the result was
-- losing a required range check in the case where 'Input is being
-- called from 'Read.
if not Has_Biased_Representation (P_Type) then
return Unchecked_Convert_To (Base_Type (P_Type), Res);
-- For the biased case, the conversion to the base type loses the
-- biasing, so just convert to Ptype. This is not quite right, and
-- for example may lose a corner case CE test, but it is such a
-- rare case that for now we ignore it ???
else
return Unchecked_Convert_To (P_Type, Res);
end if;
end if;
end Build_Elementary_Input_Call;
---------------------------------
-- Build_Elementary_Write_Call --
---------------------------------
function Build_Elementary_Write_Call (N : Node_Id) return Node_Id is
Loc : constant Source_Ptr := Sloc (N);
P_Type : constant Entity_Id := Entity (Prefix (N));
U_Type : constant Entity_Id := Underlying_Type (P_Type);
Rt_Type : constant Entity_Id := Root_Type (U_Type);
FST : constant Entity_Id := First_Subtype (U_Type);
Strm : constant Node_Id := First (Expressions (N));
Item : constant Node_Id := Next (Strm);
P_Size : Uint;
Lib_RE : RE_Id;
Libent : Entity_Id;
begin
-- Compute the size of the stream element. This is either the size of
-- the first subtype or if given the size of the Stream_Size attribute.
if Has_Stream_Size_Clause (FST) then
P_Size := Static_Integer (Expression (Stream_Size_Clause (FST)));
else
P_Size := Esize (FST);
end if;
-- Find the routine to be called
-- Check for First Boolean and Character. These are enumeration types,
-- but we treat them specially, since they may require special handling
-- in the transfer protocol. However, this special handling only applies
-- if they have standard representation, otherwise they are treated like
-- any other enumeration type.
if Rt_Type = Standard_Boolean
and then Has_Stream_Standard_Rep (U_Type)
then
Lib_RE := RE_W_B;
elsif Rt_Type = Standard_Character
and then Has_Stream_Standard_Rep (U_Type)
then
Lib_RE := RE_W_C;
elsif Rt_Type = Standard_Wide_Character
and then Has_Stream_Standard_Rep (U_Type)
then
Lib_RE := RE_W_WC;
elsif Rt_Type = Standard_Wide_Wide_Character
and then Has_Stream_Standard_Rep (U_Type)
then
Lib_RE := RE_W_WWC;
-- Floating point types
elsif Is_Floating_Point_Type (U_Type) then
-- Question: should we use P_Size or Rt_Type to distinguish between
-- possible floating point types? If a non-standard size or a stream
-- size is specified, then we should certainly use the size. But if
-- we have two types the same (notably Short_Float_Size = Float_Size
-- which is close to universally true, and Long_Long_Float_Size =
-- Long_Float_Size, true on most targets except the x86), then we
-- would really rather use the root type, so that if people want to
-- fiddle with System.Stream_Attributes to get inter-target portable
-- streams, they get the size they expect. Consider in particular the
-- case of a stream written on an x86, with 96-bit Long_Long_Float
-- being read into a non-x86 target with 64 bit Long_Long_Float. A
-- special version of System.Stream_Attributes can deal with this
-- provided the proper type is always used.
-- To deal with these two requirements we add the special checks
-- on equal sizes and use the root type to distinguish.
if P_Size <= Standard_Short_Float_Size
and then (Standard_Short_Float_Size /= Standard_Float_Size
or else Rt_Type = Standard_Short_Float)
then
Lib_RE := RE_W_SF;
elsif P_Size <= Standard_Float_Size then
Lib_RE := RE_W_F;
elsif P_Size <= Standard_Long_Float_Size
and then (Standard_Long_Float_Size /= Standard_Long_Long_Float_Size
or else Rt_Type = Standard_Long_Float)
then
Lib_RE := RE_W_LF;
else
Lib_RE := RE_W_LLF;
end if;
-- Signed integer types. Also includes signed fixed-point types and
-- signed enumeration types share this circuitry.
-- Note on signed integer types. We do not consider types as signed for
-- this purpose if they have no negative numbers, or if they have biased
-- representation. The reason is that the value in either case basically
-- represents an unsigned value.
-- For example, consider:
-- type W is range 0 .. 2**32 - 1;
-- for W'Size use 32;
-- This is a signed type, but the representation is unsigned, and may
-- be outside the range of a 32-bit signed integer, so this must be
-- treated as 32-bit unsigned.
-- Similarly, the representation is also unsigned if we have:
-- type W is range -1 .. +254;
-- for W'Size use 8;
-- forcing a biased and unsigned representation
elsif not Is_Unsigned_Type (FST)
and then
(Is_Fixed_Point_Type (U_Type)
or else
Is_Enumeration_Type (U_Type)
or else
(Is_Signed_Integer_Type (U_Type)
and then not Has_Biased_Representation (FST)))
then
if P_Size <= Standard_Short_Short_Integer_Size then
Lib_RE := RE_W_SSI;
elsif P_Size <= Standard_Short_Integer_Size then
Lib_RE := RE_W_SI;
elsif P_Size <= Standard_Integer_Size then
Lib_RE := RE_W_I;
elsif P_Size <= Standard_Long_Integer_Size then
Lib_RE := RE_W_LI;
else
Lib_RE := RE_W_LLI;
end if;
-- Unsigned integer types, also includes unsigned fixed-point types
-- and unsigned enumeration types (note we know they are unsigned
-- because we already tested for signed above).
-- Also includes signed integer types that are unsigned in the sense
-- that they do not include negative numbers. See above for details.
elsif Is_Modular_Integer_Type (U_Type)
or else Is_Fixed_Point_Type (U_Type)
or else Is_Enumeration_Type (U_Type)
or else Is_Signed_Integer_Type (U_Type)
then
if P_Size <= Standard_Short_Short_Integer_Size then
Lib_RE := RE_W_SSU;
elsif P_Size <= Standard_Short_Integer_Size then
Lib_RE := RE_W_SU;
elsif P_Size <= Standard_Integer_Size then
Lib_RE := RE_W_U;
elsif P_Size <= Standard_Long_Integer_Size then
Lib_RE := RE_W_LU;
else
Lib_RE := RE_W_LLU;
end if;
else pragma Assert (Is_Access_Type (U_Type));
if P_Size > System_Address_Size then
Lib_RE := RE_W_AD;
else
Lib_RE := RE_W_AS;
end if;
end if;
-- Unchecked-convert parameter to the required type (i.e. the type of
-- the corresponding parameter, and call the appropriate routine.
Libent := RTE (Lib_RE);
return
Make_Procedure_Call_Statement (Loc,
Name => New_Occurrence_Of (Libent, Loc),
Parameter_Associations => New_List (
Relocate_Node (Strm),
Unchecked_Convert_To (Etype (Next_Formal (First_Formal (Libent))),
Relocate_Node (Item))));
end Build_Elementary_Write_Call;
-----------------------------------------
-- Build_Mutable_Record_Read_Procedure --
-----------------------------------------
procedure Build_Mutable_Record_Read_Procedure
(Loc : Source_Ptr;
Typ : Entity_Id;
Decl : out Node_Id;
Pnam : out Entity_Id)
is
Out_Formal : Node_Id;
-- Expression denoting the out formal parameter
Dcls : constant List_Id := New_List;
-- Declarations for the 'Read body
Stms : constant List_Id := New_List;
-- Statements for the 'Read body
Disc : Entity_Id;
-- Entity of the discriminant being processed
Tmp_For_Disc : Entity_Id;
-- Temporary object used to read the value of Disc
Tmps_For_Discs : constant List_Id := New_List;
-- List of object declarations for temporaries holding the read values
-- for the discriminants.
Cstr : constant List_Id := New_List;
-- List of constraints to be applied on temporary record
Discriminant_Checks : constant List_Id := New_List;
-- List of discriminant checks to be performed if the actual object
-- is constrained.
Tmp : constant Entity_Id := Make_Defining_Identifier (Loc, Name_V);
-- Temporary record must hide formal (assignments to components of the
-- record are always generated with V as the identifier for the record).
Constrained_Stms : List_Id := New_List;
-- Statements within the block where we have the constrained temporary
begin
-- A mutable type cannot be a tagged type, so we generate a new name
-- for the stream procedure.
Pnam :=
Make_Defining_Identifier (Loc,
Chars => Make_TSS_Name_Local (Typ, TSS_Stream_Read));
if Is_Unchecked_Union (Typ) then
-- If this is an unchecked union, the stream procedure is erroneous,
-- because there are no discriminants to read.
-- This should generate a warning ???
Append_To (Stms,
Make_Raise_Program_Error (Loc,
Reason => PE_Unchecked_Union_Restriction));
Build_Stream_Procedure (Loc, Typ, Decl, Pnam, Stms, Outp => True);
return;
end if;
Disc := First_Discriminant (Typ);
Out_Formal :=
Make_Selected_Component (Loc,
Prefix => New_Occurrence_Of (Pnam, Loc),
Selector_Name => Make_Identifier (Loc, Name_V));
-- Generate Reads for the discriminants of the type. The discriminants
-- need to be read before the rest of the components, so that variants
-- are initialized correctly. The discriminants must be read into temp
-- variables so an incomplete Read (interrupted by an exception, for
-- example) does not alter the passed object.
while Present (Disc) loop
Tmp_For_Disc := Make_Defining_Identifier (Loc,
New_External_Name (Chars (Disc), "D"));
Append_To (Tmps_For_Discs,
Make_Object_Declaration (Loc,
Defining_Identifier => Tmp_For_Disc,
Object_Definition => New_Occurrence_Of (Etype (Disc), Loc)));
Set_No_Initialization (Last (Tmps_For_Discs));
Append_To (Stms,
Make_Attribute_Reference (Loc,
Prefix => New_Occurrence_Of (Etype (Disc), Loc),
Attribute_Name => Name_Read,
Expressions => New_List (
Make_Identifier (Loc, Name_S),
New_Occurrence_Of (Tmp_For_Disc, Loc))));
Append_To (Cstr,
Make_Discriminant_Association (Loc,
Selector_Names => New_List (New_Occurrence_Of (Disc, Loc)),
Expression => New_Occurrence_Of (Tmp_For_Disc, Loc)));
Append_To (Discriminant_Checks,
Make_Raise_Constraint_Error (Loc,
Condition =>
Make_Op_Ne (Loc,
Left_Opnd => New_Occurrence_Of (Tmp_For_Disc, Loc),
Right_Opnd =>
Make_Selected_Component (Loc,
Prefix => New_Copy_Tree (Out_Formal),
Selector_Name => New_Occurrence_Of (Disc, Loc))),
Reason => CE_Discriminant_Check_Failed));
Next_Discriminant (Disc);
end loop;
-- Generate reads for the components of the record (including those
-- that depend on discriminants).
Build_Record_Read_Write_Procedure (Loc, Typ, Decl, Pnam, Name_Read);
-- Save original statement sequence for component assignments, and
-- replace it with Stms.
Constrained_Stms := Statements (Handled_Statement_Sequence (Decl));
Set_Handled_Statement_Sequence (Decl,
Make_Handled_Sequence_Of_Statements (Loc,
Statements => Stms));
-- If Typ has controlled components (i.e. if it is classwide or
-- Has_Controlled), or components constrained using the discriminants
-- of Typ, then we need to ensure that all component assignments are
-- performed on an object that has been appropriately constrained
-- prior to being initialized. To this effect, we wrap the component
-- assignments in a block where V is a constrained temporary.
Append_To (Dcls,
Make_Object_Declaration (Loc,
Defining_Identifier => Tmp,
Object_Definition =>
Make_Subtype_Indication (Loc,
Subtype_Mark => New_Occurrence_Of (Base_Type (Typ), Loc),
Constraint =>
Make_Index_Or_Discriminant_Constraint (Loc,
Constraints => Cstr))));
-- AI05-023-1: Insert discriminant check prior to initialization of the
-- constrained temporary.
Append_To (Stms,
Make_Implicit_If_Statement (Pnam,
Condition =>
Make_Attribute_Reference (Loc,
Prefix => New_Copy_Tree (Out_Formal),
Attribute_Name => Name_Constrained),
Then_Statements => Discriminant_Checks));
-- Now insert back original component assignments, wrapped in a block
-- in which V is the constrained temporary.
Append_To (Stms,
Make_Block_Statement (Loc,
Declarations => Dcls,
Handled_Statement_Sequence => Parent (Constrained_Stms)));
Append_To (Constrained_Stms,
Make_Assignment_Statement (Loc,
Name => Out_Formal,
Expression => Make_Identifier (Loc, Name_V)));
Set_Declarations (Decl, Tmps_For_Discs);
end Build_Mutable_Record_Read_Procedure;
------------------------------------------
-- Build_Mutable_Record_Write_Procedure --
------------------------------------------
procedure Build_Mutable_Record_Write_Procedure
(Loc : Source_Ptr;
Typ : Entity_Id;
Decl : out Node_Id;
Pnam : out Entity_Id)
is
Stms : List_Id;
Disc : Entity_Id;
D_Ref : Node_Id;
begin
Stms := New_List;
Disc := First_Discriminant (Typ);
-- Generate Writes for the discriminants of the type
-- If the type is an unchecked union, use the default values of
-- the discriminants, because they are not stored.
while Present (Disc) loop
if Is_Unchecked_Union (Typ) then
D_Ref :=
New_Copy_Tree (Discriminant_Default_Value (Disc));
else
D_Ref :=
Make_Selected_Component (Loc,
Prefix => Make_Identifier (Loc, Name_V),
Selector_Name => New_Occurrence_Of (Disc, Loc));
end if;
Append_To (Stms,
Make_Attribute_Reference (Loc,
Prefix => New_Occurrence_Of (Etype (Disc), Loc),
Attribute_Name => Name_Write,
Expressions => New_List (
Make_Identifier (Loc, Name_S),
D_Ref)));
Next_Discriminant (Disc);
end loop;
-- A mutable type cannot be a tagged type, so we generate a new name
-- for the stream procedure.
Pnam :=
Make_Defining_Identifier (Loc,
Chars => Make_TSS_Name_Local (Typ, TSS_Stream_Write));
Build_Record_Read_Write_Procedure (Loc, Typ, Decl, Pnam, Name_Write);
-- Write the discriminants before the rest of the components, so
-- that discriminant values are properly set of variants, etc.
if Is_Non_Empty_List (
Statements (Handled_Statement_Sequence (Decl)))
then
Insert_List_Before
(First (Statements (Handled_Statement_Sequence (Decl))), Stms);
else
Set_Statements (Handled_Statement_Sequence (Decl), Stms);
end if;
end Build_Mutable_Record_Write_Procedure;
-----------------------------------------------
-- Build_Record_Or_Elementary_Input_Function --
-----------------------------------------------
-- The function we build looks like
-- function InputN (S : access RST) return Typ is
-- C1 : constant Disc_Type_1;
-- Discr_Type_1'Read (S, C1);
-- C2 : constant Disc_Type_2;
-- Discr_Type_2'Read (S, C2);
-- ...
-- Cn : constant Disc_Type_n;
-- Discr_Type_n'Read (S, Cn);
-- V : Typ (C1, C2, .. Cn)
-- begin
-- Typ'Read (S, V);
-- return V;
-- end InputN
-- The discriminants are of course only present in the case of a record
-- with discriminants. In the case of a record with no discriminants, or
-- an elementary type, then no Cn constants are defined.
procedure Build_Record_Or_Elementary_Input_Function
(Loc : Source_Ptr;
Typ : Entity_Id;
Decl : out Node_Id;
Fnam : out Entity_Id;
Use_Underlying : Boolean := True)
is
B_Typ : Entity_Id := Base_Type (Typ);
Cn : Name_Id;
Constr : List_Id;
Decls : List_Id;
Discr : Entity_Id;
Discr_Elmt : Elmt_Id := No_Elmt;
J : Pos;
Obj_Decl : Node_Id;
Odef : Node_Id;
Stms : List_Id;
begin
if Use_Underlying then
B_Typ := Underlying_Type (B_Typ);
end if;
Decls := New_List;
Constr := New_List;
J := 1;
-- In the presence of multiple instantiations (as in uses of the Booch
-- components) the base type may be private, and the underlying type
-- already constrained, in which case there's no discriminant constraint
-- to construct.
if Has_Discriminants (Typ)
and then No (Discriminant_Default_Value (First_Discriminant (Typ)))
and then not Is_Constrained (Underlying_Type (B_Typ))
then
Discr := First_Discriminant (B_Typ);
-- If the prefix subtype is constrained, then retrieve the first
-- element of its constraint.
if Is_Constrained (Typ) then
Discr_Elmt := First_Elmt (Discriminant_Constraint (Typ));
end if;
while Present (Discr) loop
Cn := New_External_Name ('C', J);
Decl :=
Make_Object_Declaration (Loc,
Defining_Identifier => Make_Defining_Identifier (Loc, Cn),
Object_Definition =>
New_Occurrence_Of (Etype (Discr), Loc));
-- If this is an access discriminant, do not perform default
-- initialization. The discriminant is about to get its value
-- from Read, and if the type is null excluding we do not want
-- spurious warnings on an initial null value.
if Is_Access_Type (Etype (Discr)) then
Set_No_Initialization (Decl);
end if;
Append_To (Decls, Decl);
Append_To (Decls,
Make_Attribute_Reference (Loc,
Prefix => New_Occurrence_Of (Etype (Discr), Loc),
Attribute_Name => Name_Read,
Expressions => New_List (
Make_Identifier (Loc, Name_S),
Make_Identifier (Loc, Cn))));
Append_To (Constr, Make_Identifier (Loc, Cn));
-- If the prefix subtype imposes a discriminant constraint, then
-- check that each discriminant value equals the value read.
if Present (Discr_Elmt) then
Append_To (Decls,
Make_Raise_Constraint_Error (Loc,
Condition => Make_Op_Ne (Loc,
Left_Opnd =>
New_Occurrence_Of
(Defining_Identifier (Decl), Loc),
Right_Opnd =>
New_Copy_Tree (Node (Discr_Elmt))),
Reason => CE_Discriminant_Check_Failed));
Next_Elmt (Discr_Elmt);
end if;
Next_Discriminant (Discr);
J := J + 1;
end loop;
Odef :=
Make_Subtype_Indication (Loc,
Subtype_Mark => New_Occurrence_Of (B_Typ, Loc),
Constraint =>
Make_Index_Or_Discriminant_Constraint (Loc,
Constraints => Constr));
-- If no discriminants, then just use the type with no constraint
else
Odef := New_Occurrence_Of (B_Typ, Loc);
end if;
-- Create an extended return statement encapsulating the result object
-- and 'Read call, which is needed in general for proper handling of
-- build-in-place results (such as when the result type is inherently
-- limited).
Obj_Decl :=
Make_Object_Declaration (Loc,
Defining_Identifier => Make_Defining_Identifier (Loc, Name_V),
Object_Definition => Odef);
-- If the type is an access type, do not perform default initialization.
-- The object is about to get its value from Read, and if the type is
-- null excluding we do not want spurious warnings on an initial null.
if Is_Access_Type (B_Typ) then
Set_No_Initialization (Obj_Decl);
end if;
Stms := New_List (
Make_Extended_Return_Statement (Loc,
Return_Object_Declarations => New_List (Obj_Decl),
Handled_Statement_Sequence =>
Make_Handled_Sequence_Of_Statements (Loc,
Statements => New_List (
Make_Attribute_Reference (Loc,
Prefix => New_Occurrence_Of (B_Typ, Loc),
Attribute_Name => Name_Read,
Expressions => New_List (
Make_Identifier (Loc, Name_S),
Make_Identifier (Loc, Name_V)))))));
Fnam := Make_Stream_Subprogram_Name (Loc, B_Typ, TSS_Stream_Input);
Build_Stream_Function (Loc, B_Typ, Decl, Fnam, Decls, Stms);
end Build_Record_Or_Elementary_Input_Function;
-------------------------------------------------
-- Build_Record_Or_Elementary_Output_Procedure --
-------------------------------------------------
procedure Build_Record_Or_Elementary_Output_Procedure
(Loc : Source_Ptr;
Typ : Entity_Id;
Decl : out Node_Id;
Pnam : out Entity_Id)
is
Stms : List_Id;
Disc : Entity_Id;
Disc_Ref : Node_Id;
begin
Stms := New_List;
-- Note that of course there will be no discriminants for the elementary
-- type case, so Has_Discriminants will be False. Note that the language
-- rules do not allow writing the discriminants in the defaulted case,
-- because those are written by 'Write.
if Has_Discriminants (Typ)
and then No (Discriminant_Default_Value (First_Discriminant (Typ)))
then
Disc := First_Discriminant (Typ);
while Present (Disc) loop
-- If the type is an unchecked union, it must have default
-- discriminants (this is checked earlier), and those defaults
-- are written out to the stream.
if Is_Unchecked_Union (Typ) then
Disc_Ref := New_Copy_Tree (Discriminant_Default_Value (Disc));
else
Disc_Ref :=
Make_Selected_Component (Loc,
Prefix => Make_Identifier (Loc, Name_V),
Selector_Name => New_Occurrence_Of (Disc, Loc));
end if;
Append_To (Stms,
Make_Attribute_Reference (Loc,
Prefix =>
New_Occurrence_Of (Stream_Base_Type (Etype (Disc)), Loc),
Attribute_Name => Name_Write,
Expressions => New_List (
Make_Identifier (Loc, Name_S),
Disc_Ref)));
Next_Discriminant (Disc);
end loop;
end if;
Append_To (Stms,
Make_Attribute_Reference (Loc,
Prefix => New_Occurrence_Of (Typ, Loc),
Attribute_Name => Name_Write,
Expressions => New_List (
Make_Identifier (Loc, Name_S),
Make_Identifier (Loc, Name_V))));
Pnam := Make_Stream_Subprogram_Name (Loc, Typ, TSS_Stream_Output);
Build_Stream_Procedure (Loc, Typ, Decl, Pnam, Stms, False);
end Build_Record_Or_Elementary_Output_Procedure;
---------------------------------
-- Build_Record_Read_Procedure --
---------------------------------
procedure Build_Record_Read_Procedure
(Loc : Source_Ptr;
Typ : Entity_Id;
Decl : out Node_Id;
Pnam : out Entity_Id)
is
begin
Pnam := Make_Stream_Subprogram_Name (Loc, Typ, TSS_Stream_Read);
Build_Record_Read_Write_Procedure (Loc, Typ, Decl, Pnam, Name_Read);
end Build_Record_Read_Procedure;
---------------------------------------
-- Build_Record_Read_Write_Procedure --
---------------------------------------
-- The form of the record read/write procedure is as shown by the
-- following example for a case with one discriminant case variant:
-- procedure pnam (S : access RST, V : [out] Typ) is
-- begin
-- Component_Type'Read/Write (S, V.component);
-- Component_Type'Read/Write (S, V.component);
-- ...
-- Component_Type'Read/Write (S, V.component);
--
-- case V.discriminant is
-- when choices =>
-- Component_Type'Read/Write (S, V.component);
-- Component_Type'Read/Write (S, V.component);
-- ...
-- Component_Type'Read/Write (S, V.component);
--
-- when choices =>
-- Component_Type'Read/Write (S, V.component);
-- Component_Type'Read/Write (S, V.component);
-- ...
-- Component_Type'Read/Write (S, V.component);
-- ...
-- end case;
-- end pnam;
-- The out keyword for V is supplied in the Read case
procedure Build_Record_Read_Write_Procedure
(Loc : Source_Ptr;
Typ : Entity_Id;
Decl : out Node_Id;
Pnam : Entity_Id;
Nam : Name_Id)
is
Rdef : Node_Id;
Stms : List_Id;
Typt : Entity_Id;
In_Limited_Extension : Boolean := False;
-- Set to True while processing the record extension definition
-- for an extension of a limited type (for which an ancestor type
-- has an explicit Nam attribute definition).
function Make_Component_List_Attributes (CL : Node_Id) return List_Id;
-- Returns a sequence of attributes to process the components that
-- are referenced in the given component list.
function Make_Field_Attribute (C : Entity_Id) return Node_Id;
-- Given C, the entity for a discriminant or component, build
-- an attribute for the corresponding field values.
function Make_Field_Attributes (Clist : List_Id) return List_Id;
-- Given Clist, a component items list, construct series of attributes
-- for fieldwise processing of the corresponding components.
------------------------------------
-- Make_Component_List_Attributes --
------------------------------------
function Make_Component_List_Attributes (CL : Node_Id) return List_Id is
CI : constant List_Id := Component_Items (CL);
VP : constant Node_Id := Variant_Part (CL);
Result : List_Id;
Alts : List_Id;
V : Node_Id;
DC : Node_Id;
DCH : List_Id;
D_Ref : Node_Id;
begin
Result := Make_Field_Attributes (CI);
if Present (VP) then
Alts := New_List;
V := First_Non_Pragma (Variants (VP));
while Present (V) loop
DCH := New_List;
DC := First (Discrete_Choices (V));
while Present (DC) loop
Append_To (DCH, New_Copy_Tree (DC));
Next (DC);
end loop;
Append_To (Alts,
Make_Case_Statement_Alternative (Loc,
Discrete_Choices => DCH,
Statements =>
Make_Component_List_Attributes (Component_List (V))));
Next_Non_Pragma (V);
end loop;
-- Note: in the following, we make sure that we use new occurrence
-- of for the selector, since there are cases in which we make a
-- reference to a hidden discriminant that is not visible.
-- If the enclosing record is an unchecked_union, we use the
-- default expressions for the discriminant (it must exist)
-- because we cannot generate a reference to it, given that
-- it is not stored.
if Is_Unchecked_Union (Scope (Entity (Name (VP)))) then
D_Ref :=
New_Copy_Tree
(Discriminant_Default_Value (Entity (Name (VP))));
else
D_Ref :=
Make_Selected_Component (Loc,
Prefix => Make_Identifier (Loc, Name_V),
Selector_Name =>
New_Occurrence_Of (Entity (Name (VP)), Loc));
end if;
Append_To (Result,
Make_Case_Statement (Loc,
Expression => D_Ref,
Alternatives => Alts));
end if;
return Result;
end Make_Component_List_Attributes;
--------------------------
-- Make_Field_Attribute --
--------------------------
function Make_Field_Attribute (C : Entity_Id) return Node_Id is
Field_Typ : constant Entity_Id := Stream_Base_Type (Etype (C));
TSS_Names : constant array (Name_Input .. Name_Write) of
TSS_Name_Type :=
(Name_Read => TSS_Stream_Read,
Name_Write => TSS_Stream_Write,
Name_Input => TSS_Stream_Input,
Name_Output => TSS_Stream_Output,
others => TSS_Null);
pragma Assert (TSS_Names (Nam) /= TSS_Null);
begin
if In_Limited_Extension
and then Is_Limited_Type (Field_Typ)
and then No (Find_Inherited_TSS (Field_Typ, TSS_Names (Nam)))
then
-- The declaration is illegal per 13.13.2(9/1), and this is
-- enforced in Exp_Ch3.Check_Stream_Attributes. Keep the caller
-- happy by returning a null statement.
return Make_Null_Statement (Loc);
end if;
return
Make_Attribute_Reference (Loc,
Prefix => New_Occurrence_Of (Field_Typ, Loc),
Attribute_Name => Nam,
Expressions => New_List (
Make_Identifier (Loc, Name_S),
Make_Selected_Component (Loc,
Prefix => Make_Identifier (Loc, Name_V),
Selector_Name => New_Occurrence_Of (C, Loc))));
end Make_Field_Attribute;
---------------------------
-- Make_Field_Attributes --
---------------------------
function Make_Field_Attributes (Clist : List_Id) return List_Id is
Item : Node_Id;
Result : List_Id;
begin
Result := New_List;
if Present (Clist) then
Item := First (Clist);
-- Loop through components, skipping all internal components,
-- which are not part of the value (e.g. _Tag), except that we
-- don't skip the _Parent, since we do want to process that
-- recursively. If _Parent is an interface type, being abstract
-- with no components there is no need to handle it.
while Present (Item) loop
if Nkind (Item) = N_Component_Declaration
and then
((Chars (Defining_Identifier (Item)) = Name_uParent
and then not Is_Interface
(Etype (Defining_Identifier (Item))))
or else
not Is_Internal_Name (Chars (Defining_Identifier (Item))))
then
Append_To
(Result,
Make_Field_Attribute (Defining_Identifier (Item)));
end if;
Next (Item);
end loop;
end if;
return Result;
end Make_Field_Attributes;
-- Start of processing for Build_Record_Read_Write_Procedure
begin
-- For the protected type case, use corresponding record
if Is_Protected_Type (Typ) then
Typt := Corresponding_Record_Type (Typ);
else
Typt := Typ;
end if;
-- Note that we do nothing with the discriminants, since Read and
-- Write do not read or write the discriminant values. All handling
-- of discriminants occurs in the Input and Output subprograms.
Rdef := Type_Definition
(Declaration_Node (Base_Type (Underlying_Type (Typt))));
Stms := Empty_List;
-- In record extension case, the fields we want, including the _Parent
-- field representing the parent type, are to be found in the extension.
-- Note that we will naturally process the _Parent field using the type
-- of the parent, and hence its stream attributes, which is appropriate.
if Nkind (Rdef) = N_Derived_Type_Definition then
Rdef := Record_Extension_Part (Rdef);
if Is_Limited_Type (Typt) then
In_Limited_Extension := True;
end if;
end if;
if Present (Component_List (Rdef)) then
Append_List_To (Stms,
Make_Component_List_Attributes (Component_List (Rdef)));
end if;
Build_Stream_Procedure
(Loc, Typ, Decl, Pnam, Stms, Nam = Name_Read);
end Build_Record_Read_Write_Procedure;
----------------------------------
-- Build_Record_Write_Procedure --
----------------------------------
procedure Build_Record_Write_Procedure
(Loc : Source_Ptr;
Typ : Entity_Id;
Decl : out Node_Id;
Pnam : out Entity_Id)
is
begin
Pnam := Make_Stream_Subprogram_Name (Loc, Typ, TSS_Stream_Write);
Build_Record_Read_Write_Procedure (Loc, Typ, Decl, Pnam, Name_Write);
end Build_Record_Write_Procedure;
-------------------------------
-- Build_Stream_Attr_Profile --
-------------------------------
function Build_Stream_Attr_Profile
(Loc : Source_Ptr;
Typ : Entity_Id;
Nam : TSS_Name_Type) return List_Id
is
Profile : List_Id;
begin
-- (Ada 2005: AI-441): Set the null-excluding attribute because it has
-- no semantic meaning in Ada 95 but it is a requirement in Ada 2005.
Profile := New_List (
Make_Parameter_Specification (Loc,
Defining_Identifier => Make_Defining_Identifier (Loc, Name_S),
Parameter_Type =>
Make_Access_Definition (Loc,
Null_Exclusion_Present => True,
Subtype_Mark => New_Occurrence_Of (
Class_Wide_Type (RTE (RE_Root_Stream_Type)), Loc))));
if Nam /= TSS_Stream_Input then
Append_To (Profile,
Make_Parameter_Specification (Loc,
Defining_Identifier => Make_Defining_Identifier (Loc, Name_V),
Out_Present => (Nam = TSS_Stream_Read),
Parameter_Type => New_Occurrence_Of (Typ, Loc)));
end if;
return Profile;
end Build_Stream_Attr_Profile;
---------------------------
-- Build_Stream_Function --
---------------------------
procedure Build_Stream_Function
(Loc : Source_Ptr;
Typ : Entity_Id;
Decl : out Node_Id;
Fnam : Entity_Id;
Decls : List_Id;
Stms : List_Id)
is
Spec : Node_Id;
begin
-- Construct function specification
-- (Ada 2005: AI-441): Set the null-excluding attribute because it has
-- no semantic meaning in Ada 95 but it is a requirement in Ada 2005.
Spec :=
Make_Function_Specification (Loc,
Defining_Unit_Name => Fnam,
Parameter_Specifications => New_List (
Make_Parameter_Specification (Loc,
Defining_Identifier => Make_Defining_Identifier (Loc, Name_S),
Parameter_Type =>
Make_Access_Definition (Loc,
Null_Exclusion_Present => True,
Subtype_Mark =>
New_Occurrence_Of
(Class_Wide_Type (RTE (RE_Root_Stream_Type)), Loc)))),
Result_Definition => New_Occurrence_Of (Typ, Loc));
Decl :=
Make_Subprogram_Body (Loc,
Specification => Spec,
Declarations => Decls,
Handled_Statement_Sequence =>
Make_Handled_Sequence_Of_Statements (Loc,
Statements => Stms));
end Build_Stream_Function;
----------------------------
-- Build_Stream_Procedure --
----------------------------
procedure Build_Stream_Procedure
(Loc : Source_Ptr;
Typ : Entity_Id;
Decl : out Node_Id;
Pnam : Entity_Id;
Stms : List_Id;
Outp : Boolean)
is
Spec : Node_Id;
begin
-- Construct procedure specification
-- (Ada 2005: AI-441): Set the null-excluding attribute because it has
-- no semantic meaning in Ada 95 but it is a requirement in Ada 2005.
Spec :=
Make_Procedure_Specification (Loc,
Defining_Unit_Name => Pnam,
Parameter_Specifications => New_List (
Make_Parameter_Specification (Loc,
Defining_Identifier => Make_Defining_Identifier (Loc, Name_S),
Parameter_Type =>
Make_Access_Definition (Loc,
Null_Exclusion_Present => True,
Subtype_Mark =>
New_Occurrence_Of
(Class_Wide_Type (RTE (RE_Root_Stream_Type)), Loc))),
Make_Parameter_Specification (Loc,
Defining_Identifier => Make_Defining_Identifier (Loc, Name_V),
Out_Present => Outp,
Parameter_Type => New_Occurrence_Of (Typ, Loc))));
Decl :=
Make_Subprogram_Body (Loc,
Specification => Spec,
Declarations => Empty_List,
Handled_Statement_Sequence =>
Make_Handled_Sequence_Of_Statements (Loc,
Statements => Stms));
end Build_Stream_Procedure;
-----------------------------
-- Has_Stream_Standard_Rep --
-----------------------------
function Has_Stream_Standard_Rep (U_Type : Entity_Id) return Boolean is
Siz : Uint;
begin
if Has_Non_Standard_Rep (U_Type) then
return False;
end if;
if Has_Stream_Size_Clause (U_Type) then
Siz := Static_Integer (Expression (Stream_Size_Clause (U_Type)));
else
Siz := Esize (First_Subtype (U_Type));
end if;
return Siz = Esize (Root_Type (U_Type));
end Has_Stream_Standard_Rep;
---------------------------------
-- Make_Stream_Subprogram_Name --
---------------------------------
function Make_Stream_Subprogram_Name
(Loc : Source_Ptr;
Typ : Entity_Id;
Nam : TSS_Name_Type) return Entity_Id
is
Sname : Name_Id;
begin
-- For tagged types, we are dealing with a TSS associated with the
-- declaration, so we use the standard primitive function name. For
-- other types, generate a local TSS name since we are generating
-- the subprogram at the point of use.
if Is_Tagged_Type (Typ) then
Sname := Make_TSS_Name (Typ, Nam);
else
Sname := Make_TSS_Name_Local (Typ, Nam);
end if;
return Make_Defining_Identifier (Loc, Sname);
end Make_Stream_Subprogram_Name;
----------------------
-- Stream_Base_Type --
----------------------
function Stream_Base_Type (E : Entity_Id) return Entity_Id is
begin
if Is_Array_Type (E)
and then Is_First_Subtype (E)
then
return E;
else
return Base_Type (E);
end if;
end Stream_Base_Type;
end Exp_Strm;
| 36.512209 | 79 | 0.578129 |
c52fb859c0d119bbddd24176c74134d3ec309e49 | 977 | ads | Ada | source/resolver/program-resolvers.ads | reznikmm/gela | 20134f1d154fb763812e73860c6f4b04f353df79 | [
"MIT"
] | null | null | null | source/resolver/program-resolvers.ads | reznikmm/gela | 20134f1d154fb763812e73860c6f4b04f353df79 | [
"MIT"
] | null | null | null | source/resolver/program-resolvers.ads | reznikmm/gela | 20134f1d154fb763812e73860c6f4b04f353df79 | [
"MIT"
] | 1 | 2019-10-16T09:05:27.000Z | 2019-10-16T09:05:27.000Z | -- SPDX-FileCopyrightText: 2019-2021 Max Reznik <[email protected]>
--
-- SPDX-License-Identifier: MIT
-------------------------------------------------------------
with Program.Compilation_Units;
with Program.Elements.Expressions;
with Program.Library_Environments;
with Program.Symbol_Lists;
with Program.Visibility;
with Program.Cross_Reference_Updaters;
with Program.Simple_Resolvers;
private package Program.Resolvers is
pragma Preelaborate;
procedure Resolve_Names
(Unit : not null Program.Compilation_Units.Compilation_Unit_Access;
Unit_Name_Resolver : not null
Program.Simple_Resolvers.Simple_Resolver_Access;
Lists : in out Program.Symbol_Lists.Symbol_List_Table'Class;
Context : not null Program.Visibility.Context_Access;
Library : in out Program.Library_Environments.Library_Environment;
Setter : not null
Program.Cross_Reference_Updaters.Cross_Reference_Updater_Access);
end Program.Resolvers;
| 34.892857 | 75 | 0.73695 |
dcfa9d303387ddb2b8aa679f92008c5b70ba0520 | 2,755 | ads | Ada | source/league/matreshka-internals-regexps-compiler-debug.ads | svn2github/matreshka | 9d222b3ad9da508855fb1f5adbe5e8a4fad4c530 | [
"BSD-3-Clause"
] | 24 | 2016-11-29T06:59:41.000Z | 2021-08-30T11:55:16.000Z | source/league/matreshka-internals-regexps-compiler-debug.ads | svn2github/matreshka | 9d222b3ad9da508855fb1f5adbe5e8a4fad4c530 | [
"BSD-3-Clause"
] | 2 | 2019-01-16T05:15:20.000Z | 2019-02-03T10:03:32.000Z | source/league/matreshka-internals-regexps-compiler-debug.ads | svn2github/matreshka | 9d222b3ad9da508855fb1f5adbe5e8a4fad4c530 | [
"BSD-3-Clause"
] | 4 | 2017-07-18T07:11:05.000Z | 2020-06-21T03:02:25.000Z | ------------------------------------------------------------------------------
-- --
-- Matreshka Project --
-- --
-- Localization, Internationalization, Globalization for Ada --
-- --
-- Runtime Library Component --
-- --
------------------------------------------------------------------------------
-- --
-- Copyright © 2010 Vadim Godunko <[email protected]> --
-- --
-- Matreshka 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 2, or (at your option) any later --
-- version. Matreshka 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 distributed with Matreshka; 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. --
-- --
------------------------------------------------------------------------------
-- $Revision$ $Date$
------------------------------------------------------------------------------
package Matreshka.Internals.Regexps.Compiler.Debug is
pragma Preelaborate;
function Dump (Pattern : not null Shared_Pattern_Access) return String;
end Matreshka.Internals.Regexps.Compiler.Debug;
| 65.595238 | 78 | 0.419964 |
18c464e2522c2c8b2eb08e1214488e8be5d449c2 | 118,394 | adb | Ada | deeplib/deeplib/solution1/.autopilot/db/p_hls_fptosi_float_i.adb | mfarhadi/CNNIOT | a14f84f3589a52e56973656044220b742933fa60 | [
"MIT"
] | 30 | 2018-05-16T17:06:38.000Z | 2022-03-11T01:43:13.000Z | deeplib/deeplib/solution1/.autopilot/db/p_hls_fptosi_float_i.adb | HarperShi/CNNIOT | a14f84f3589a52e56973656044220b742933fa60 | [
"MIT"
] | 1 | 2020-11-05T07:58:21.000Z | 2020-11-05T07:58:21.000Z | deeplib/deeplib/solution1/.autopilot/db/p_hls_fptosi_float_i.adb | HarperShi/CNNIOT | a14f84f3589a52e56973656044220b742933fa60 | [
"MIT"
] | 13 | 2018-10-18T09:07:25.000Z | 2022-01-03T14:07:30.000Z | <?xml version="1.0" encoding="UTF-8" standalone="yes" ?>
<!DOCTYPE boost_serialization>
<boost_serialization signature="serialization::archive" version="15">
<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>p_hls_fptosi_float_i</name>
<ret_bitwidth>32</ret_bitwidth>
<ports class_id="2" tracking_level="0" version="0">
<count>1</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>x</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>x</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>
</ports>
<nodes class_id="8" tracking_level="0" version="0">
<count>25</count>
<item_version>0</item_version>
<item class_id="9" tracking_level="1" version="0" object_id="_2">
<Value>
<Obj>
<type>0</type>
<id>2</id>
<name>x_read</name>
<fileName/>
<fileDirectory/>
<lineNumber>0</lineNumber>
<contextFuncName/>
<inlineStackInfo>
<count>0</count>
<item_version>0</item_version>
</inlineStackInfo>
<originalName>x</originalName>
<rtlName/>
<coreName/>
</Obj>
<bitwidth>32</bitwidth>
</Value>
<oprand_edges>
<count>2</count>
<item_version>0</item_version>
<item>29</item>
<item>30</item>
</oprand_edges>
<opcode>read</opcode>
<m_Display>0</m_Display>
</item>
<item class_id_reference="9" object_id="_3">
<Value>
<Obj>
<type>0</type>
<id>3</id>
<name>p_Val2_s</name>
<fileName>/wrk/2017.4/nightly/2017_12_15_2086221/src/products/hls/src/technology/autopilot/header_files/utils/x_hls_utils.h</fileName>
<fileDirectory>../../../../../../../wrk/2017.4/nightly/2017_12_15_2086221/src/products</fileDirectory>
<lineNumber>311</lineNumber>
<contextFuncName>fp_struct</contextFuncName>
<inlineStackInfo>
<count>1</count>
<item_version>0</item_version>
<item class_id="11" tracking_level="0" version="0">
<first>/wrk/2017.4/nightly/2017_12_15_2086221/src/products</first>
<second class_id="12" tracking_level="0" version="0">
<count>4</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>/wrk/2017.4/nightly/2017_12_15_2086221/src/products/hls/hls_lib/hlsmath/src/../include/internal/hls_round.h</first>
<second>generic_cast_IEEE754&lt;int, 6, float&gt;</second>
</first>
<second>281</second>
</item>
<item>
<first>
<first>/wrk/2017.4/nightly/2017_12_15_2086221/src/products/hls/hls_lib/hlsmath/src/../include/internal/hls_round.h</first>
<second>generic_cast_IEEE754&lt;int, float&gt;</second>
</first>
<second>368</second>
</item>
<item>
<first>
<first>/wrk/2017.4/nightly/2017_12_15_2086221/src/products/hls/hls_lib/hlsmath/src/lib_floatconversion.cpp</first>
<second>__hls_fptosi_float_i32</second>
</first>
<second>49</second>
</item>
<item>
<first>
<first>/wrk/2017.4/nightly/2017_12_15_2086221/src/products/hls/src/technology/autopilot/header_files/utils/x_hls_utils.h</first>
<second>fp_struct</second>
</first>
<second>311</second>
</item>
</second>
</item>
</inlineStackInfo>
<originalName>val</originalName>
<rtlName>p_Val2_s_fu_44_p1</rtlName>
<coreName/>
</Obj>
<bitwidth>32</bitwidth>
</Value>
<oprand_edges>
<count>1</count>
<item_version>0</item_version>
<item>31</item>
</oprand_edges>
<opcode>bitcast</opcode>
<m_Display>0</m_Display>
</item>
<item class_id_reference="9" object_id="_4">
<Value>
<Obj>
<type>0</type>
<id>4</id>
<name>p_Result_s</name>
<fileName>/wrk/2017.4/nightly/2017_12_15_2086221/src/products/hls/src/technology/autopilot/header_files/utils/x_hls_utils.h</fileName>
<fileDirectory>../../../../../../../wrk/2017.4/nightly/2017_12_15_2086221/src/products</fileDirectory>
<lineNumber>317</lineNumber>
<contextFuncName>fp_struct</contextFuncName>
<inlineStackInfo>
<count>1</count>
<item_version>0</item_version>
<item>
<first>/wrk/2017.4/nightly/2017_12_15_2086221/src/products</first>
<second>
<count>4</count>
<item_version>0</item_version>
<item>
<first>
<first>/wrk/2017.4/nightly/2017_12_15_2086221/src/products/hls/hls_lib/hlsmath/src/../include/internal/hls_round.h</first>
<second>generic_cast_IEEE754&lt;int, 6, float&gt;</second>
</first>
<second>281</second>
</item>
<item>
<first>
<first>/wrk/2017.4/nightly/2017_12_15_2086221/src/products/hls/hls_lib/hlsmath/src/../include/internal/hls_round.h</first>
<second>generic_cast_IEEE754&lt;int, float&gt;</second>
</first>
<second>368</second>
</item>
<item>
<first>
<first>/wrk/2017.4/nightly/2017_12_15_2086221/src/products/hls/hls_lib/hlsmath/src/lib_floatconversion.cpp</first>
<second>__hls_fptosi_float_i32</second>
</first>
<second>49</second>
</item>
<item>
<first>
<first>/wrk/2017.4/nightly/2017_12_15_2086221/src/products/hls/src/technology/autopilot/header_files/utils/x_hls_utils.h</first>
<second>fp_struct</second>
</first>
<second>317</second>
</item>
</second>
</item>
</inlineStackInfo>
<originalName>__Result__</originalName>
<rtlName>p_Result_s_reg_185</rtlName>
<coreName/>
</Obj>
<bitwidth>1</bitwidth>
</Value>
<oprand_edges>
<count>3</count>
<item_version>0</item_version>
<item>33</item>
<item>34</item>
<item>36</item>
</oprand_edges>
<opcode>bitselect</opcode>
<m_Display>0</m_Display>
</item>
<item class_id_reference="9" object_id="_5">
<Value>
<Obj>
<type>0</type>
<id>5</id>
<name>loc_V</name>
<fileName>/wrk/2017.4/nightly/2017_12_15_2086221/src/products/hls/src/technology/autopilot/header_files/utils/x_hls_utils.h</fileName>
<fileDirectory>../../../../../../../wrk/2017.4/nightly/2017_12_15_2086221/src/products</fileDirectory>
<lineNumber>318</lineNumber>
<contextFuncName>fp_struct</contextFuncName>
<inlineStackInfo>
<count>1</count>
<item_version>0</item_version>
<item>
<first>/wrk/2017.4/nightly/2017_12_15_2086221/src/products</first>
<second>
<count>4</count>
<item_version>0</item_version>
<item>
<first>
<first>/wrk/2017.4/nightly/2017_12_15_2086221/src/products/hls/hls_lib/hlsmath/src/../include/internal/hls_round.h</first>
<second>generic_cast_IEEE754&lt;int, 6, float&gt;</second>
</first>
<second>281</second>
</item>
<item>
<first>
<first>/wrk/2017.4/nightly/2017_12_15_2086221/src/products/hls/hls_lib/hlsmath/src/../include/internal/hls_round.h</first>
<second>generic_cast_IEEE754&lt;int, float&gt;</second>
</first>
<second>368</second>
</item>
<item>
<first>
<first>/wrk/2017.4/nightly/2017_12_15_2086221/src/products/hls/hls_lib/hlsmath/src/lib_floatconversion.cpp</first>
<second>__hls_fptosi_float_i32</second>
</first>
<second>49</second>
</item>
<item>
<first>
<first>/wrk/2017.4/nightly/2017_12_15_2086221/src/products/hls/src/technology/autopilot/header_files/utils/x_hls_utils.h</first>
<second>fp_struct</second>
</first>
<second>318</second>
</item>
</second>
</item>
</inlineStackInfo>
<originalName>loc.V</originalName>
<rtlName>loc_V_fu_56_p4</rtlName>
<coreName/>
</Obj>
<bitwidth>8</bitwidth>
</Value>
<oprand_edges>
<count>4</count>
<item_version>0</item_version>
<item>38</item>
<item>39</item>
<item>41</item>
<item>43</item>
</oprand_edges>
<opcode>partselect</opcode>
<m_Display>0</m_Display>
</item>
<item class_id_reference="9" object_id="_6">
<Value>
<Obj>
<type>0</type>
<id>6</id>
<name>loc_V_1</name>
<fileName>/wrk/2017.4/nightly/2017_12_15_2086221/src/products/hls/src/technology/autopilot/header_files/utils/x_hls_utils.h</fileName>
<fileDirectory>../../../../../../../wrk/2017.4/nightly/2017_12_15_2086221/src/products</fileDirectory>
<lineNumber>319</lineNumber>
<contextFuncName>fp_struct</contextFuncName>
<inlineStackInfo>
<count>1</count>
<item_version>0</item_version>
<item>
<first>/wrk/2017.4/nightly/2017_12_15_2086221/src/products</first>
<second>
<count>4</count>
<item_version>0</item_version>
<item>
<first>
<first>/wrk/2017.4/nightly/2017_12_15_2086221/src/products/hls/hls_lib/hlsmath/src/../include/internal/hls_round.h</first>
<second>generic_cast_IEEE754&lt;int, 6, float&gt;</second>
</first>
<second>281</second>
</item>
<item>
<first>
<first>/wrk/2017.4/nightly/2017_12_15_2086221/src/products/hls/hls_lib/hlsmath/src/../include/internal/hls_round.h</first>
<second>generic_cast_IEEE754&lt;int, float&gt;</second>
</first>
<second>368</second>
</item>
<item>
<first>
<first>/wrk/2017.4/nightly/2017_12_15_2086221/src/products/hls/hls_lib/hlsmath/src/lib_floatconversion.cpp</first>
<second>__hls_fptosi_float_i32</second>
</first>
<second>49</second>
</item>
<item>
<first>
<first>/wrk/2017.4/nightly/2017_12_15_2086221/src/products/hls/src/technology/autopilot/header_files/utils/x_hls_utils.h</first>
<second>fp_struct</second>
</first>
<second>319</second>
</item>
</second>
</item>
</inlineStackInfo>
<originalName>loc.V</originalName>
<rtlName>loc_V_1_fu_66_p1</rtlName>
<coreName/>
</Obj>
<bitwidth>23</bitwidth>
</Value>
<oprand_edges>
<count>1</count>
<item_version>0</item_version>
<item>44</item>
</oprand_edges>
<opcode>trunc</opcode>
<m_Display>0</m_Display>
</item>
<item class_id_reference="9" object_id="_7">
<Value>
<Obj>
<type>0</type>
<id>7</id>
<name>tmp_3_i_i</name>
<fileName>/wrk/2017.4/nightly/2017_12_15_2086221/src/products/hls/hls_lib/hlsmath/src/../include/internal/hls_round.h</fileName>
<fileDirectory>../../../../../../../wrk/2017.4/nightly/2017_12_15_2086221/src/products</fileDirectory>
<lineNumber>283</lineNumber>
<contextFuncName>generic_cast_IEEE754&lt;int, 6, float&gt;</contextFuncName>
<inlineStackInfo>
<count>1</count>
<item_version>0</item_version>
<item>
<first>/wrk/2017.4/nightly/2017_12_15_2086221/src/products</first>
<second>
<count>3</count>
<item_version>0</item_version>
<item>
<first>
<first>/wrk/2017.4/nightly/2017_12_15_2086221/src/products/hls/hls_lib/hlsmath/src/../include/internal/hls_round.h</first>
<second>generic_cast_IEEE754&lt;int, 6, float&gt;</second>
</first>
<second>283</second>
</item>
<item>
<first>
<first>/wrk/2017.4/nightly/2017_12_15_2086221/src/products/hls/hls_lib/hlsmath/src/../include/internal/hls_round.h</first>
<second>generic_cast_IEEE754&lt;int, float&gt;</second>
</first>
<second>368</second>
</item>
<item>
<first>
<first>/wrk/2017.4/nightly/2017_12_15_2086221/src/products/hls/hls_lib/hlsmath/src/lib_floatconversion.cpp</first>
<second>__hls_fptosi_float_i32</second>
</first>
<second>49</second>
</item>
</second>
</item>
</inlineStackInfo>
<originalName/>
<rtlName>tmp_3_i_i_fu_70_p4</rtlName>
<coreName/>
</Obj>
<bitwidth>25</bitwidth>
</Value>
<oprand_edges>
<count>4</count>
<item_version>0</item_version>
<item>46</item>
<item>48</item>
<item>49</item>
<item>51</item>
</oprand_edges>
<opcode>bitconcatenate</opcode>
<m_Display>0</m_Display>
</item>
<item class_id_reference="9" object_id="_8">
<Value>
<Obj>
<type>0</type>
<id>8</id>
<name>tmp_3_i_i_cast2</name>
<fileName>/wrk/2017.4/nightly/2017_12_15_2086221/src/products/hls/hls_lib/hlsmath/src/../include/internal/hls_round.h</fileName>
<fileDirectory>../../../../../../../wrk/2017.4/nightly/2017_12_15_2086221/src/products</fileDirectory>
<lineNumber>283</lineNumber>
<contextFuncName>generic_cast_IEEE754&lt;int, 6, float&gt;</contextFuncName>
<inlineStackInfo>
<count>1</count>
<item_version>0</item_version>
<item>
<first>/wrk/2017.4/nightly/2017_12_15_2086221/src/products</first>
<second>
<count>3</count>
<item_version>0</item_version>
<item>
<first>
<first>/wrk/2017.4/nightly/2017_12_15_2086221/src/products/hls/hls_lib/hlsmath/src/../include/internal/hls_round.h</first>
<second>generic_cast_IEEE754&lt;int, 6, float&gt;</second>
</first>
<second>283</second>
</item>
<item>
<first>
<first>/wrk/2017.4/nightly/2017_12_15_2086221/src/products/hls/hls_lib/hlsmath/src/../include/internal/hls_round.h</first>
<second>generic_cast_IEEE754&lt;int, float&gt;</second>
</first>
<second>368</second>
</item>
<item>
<first>
<first>/wrk/2017.4/nightly/2017_12_15_2086221/src/products/hls/hls_lib/hlsmath/src/lib_floatconversion.cpp</first>
<second>__hls_fptosi_float_i32</second>
</first>
<second>49</second>
</item>
</second>
</item>
</inlineStackInfo>
<originalName/>
<rtlName>tmp_3_i_i_cast2_fu_80_p1</rtlName>
<coreName/>
</Obj>
<bitwidth>79</bitwidth>
</Value>
<oprand_edges>
<count>1</count>
<item_version>0</item_version>
<item>52</item>
</oprand_edges>
<opcode>zext</opcode>
<m_Display>0</m_Display>
</item>
<item class_id_reference="9" object_id="_9">
<Value>
<Obj>
<type>0</type>
<id>9</id>
<name>tmp_i_i_i_cast1</name>
<fileName>/wrk/2017.4/nightly/2017_12_15_2086221/src/products/hls/src/technology/autopilot/header_files/utils/x_hls_utils.h</fileName>
<fileDirectory>../../../../../../../wrk/2017.4/nightly/2017_12_15_2086221/src/products</fileDirectory>
<lineNumber>340</lineNumber>
<contextFuncName>expv</contextFuncName>
<inlineStackInfo>
<count>1</count>
<item_version>0</item_version>
<item>
<first>/wrk/2017.4/nightly/2017_12_15_2086221/src/products</first>
<second>
<count>4</count>
<item_version>0</item_version>
<item>
<first>
<first>/wrk/2017.4/nightly/2017_12_15_2086221/src/products/hls/hls_lib/hlsmath/src/../include/internal/hls_round.h</first>
<second>generic_cast_IEEE754&lt;int, 6, float&gt;</second>
</first>
<second>286</second>
</item>
<item>
<first>
<first>/wrk/2017.4/nightly/2017_12_15_2086221/src/products/hls/hls_lib/hlsmath/src/../include/internal/hls_round.h</first>
<second>generic_cast_IEEE754&lt;int, float&gt;</second>
</first>
<second>368</second>
</item>
<item>
<first>
<first>/wrk/2017.4/nightly/2017_12_15_2086221/src/products/hls/hls_lib/hlsmath/src/lib_floatconversion.cpp</first>
<second>__hls_fptosi_float_i32</second>
</first>
<second>49</second>
</item>
<item>
<first>
<first>/wrk/2017.4/nightly/2017_12_15_2086221/src/products/hls/src/technology/autopilot/header_files/utils/x_hls_utils.h</first>
<second>expv</second>
</first>
<second>340</second>
</item>
</second>
</item>
</inlineStackInfo>
<originalName/>
<rtlName>tmp_i_i_i_cast1_fu_84_p1</rtlName>
<coreName/>
</Obj>
<bitwidth>9</bitwidth>
</Value>
<oprand_edges>
<count>1</count>
<item_version>0</item_version>
<item>53</item>
</oprand_edges>
<opcode>zext</opcode>
<m_Display>0</m_Display>
</item>
<item class_id_reference="9" object_id="_10">
<Value>
<Obj>
<type>0</type>
<id>10</id>
<name>sh_assign</name>
<fileName>/wrk/2017.4/nightly/2017_12_15_2086221/src/products/hls/src/technology/autopilot/header_files/utils/x_hls_utils.h</fileName>
<fileDirectory>../../../../../../../wrk/2017.4/nightly/2017_12_15_2086221/src/products</fileDirectory>
<lineNumber>340</lineNumber>
<contextFuncName>expv</contextFuncName>
<inlineStackInfo>
<count>1</count>
<item_version>0</item_version>
<item>
<first>/wrk/2017.4/nightly/2017_12_15_2086221/src/products</first>
<second>
<count>4</count>
<item_version>0</item_version>
<item>
<first>
<first>/wrk/2017.4/nightly/2017_12_15_2086221/src/products/hls/hls_lib/hlsmath/src/../include/internal/hls_round.h</first>
<second>generic_cast_IEEE754&lt;int, 6, float&gt;</second>
</first>
<second>286</second>
</item>
<item>
<first>
<first>/wrk/2017.4/nightly/2017_12_15_2086221/src/products/hls/hls_lib/hlsmath/src/../include/internal/hls_round.h</first>
<second>generic_cast_IEEE754&lt;int, float&gt;</second>
</first>
<second>368</second>
</item>
<item>
<first>
<first>/wrk/2017.4/nightly/2017_12_15_2086221/src/products/hls/hls_lib/hlsmath/src/lib_floatconversion.cpp</first>
<second>__hls_fptosi_float_i32</second>
</first>
<second>49</second>
</item>
<item>
<first>
<first>/wrk/2017.4/nightly/2017_12_15_2086221/src/products/hls/src/technology/autopilot/header_files/utils/x_hls_utils.h</first>
<second>expv</second>
</first>
<second>340</second>
</item>
</second>
</item>
</inlineStackInfo>
<originalName>sh</originalName>
<rtlName>sh_assign_fu_88_p2</rtlName>
<coreName/>
</Obj>
<bitwidth>9</bitwidth>
</Value>
<oprand_edges>
<count>2</count>
<item_version>0</item_version>
<item>55</item>
<item>56</item>
</oprand_edges>
<opcode>add</opcode>
<m_Display>0</m_Display>
</item>
<item class_id_reference="9" object_id="_11">
<Value>
<Obj>
<type>0</type>
<id>11</id>
<name>isNeg</name>
<fileName>/wrk/2017.4/nightly/2017_12_15_2086221/src/products/hls/hls_lib/hlsmath/src/../include/internal/hls_round.h</fileName>
<fileDirectory>../../../../../../../wrk/2017.4/nightly/2017_12_15_2086221/src/products</fileDirectory>
<lineNumber>286</lineNumber>
<contextFuncName>generic_cast_IEEE754&lt;int, 6, float&gt;</contextFuncName>
<inlineStackInfo>
<count>1</count>
<item_version>0</item_version>
<item>
<first>/wrk/2017.4/nightly/2017_12_15_2086221/src/products</first>
<second>
<count>3</count>
<item_version>0</item_version>
<item>
<first>
<first>/wrk/2017.4/nightly/2017_12_15_2086221/src/products/hls/hls_lib/hlsmath/src/../include/internal/hls_round.h</first>
<second>generic_cast_IEEE754&lt;int, 6, float&gt;</second>
</first>
<second>286</second>
</item>
<item>
<first>
<first>/wrk/2017.4/nightly/2017_12_15_2086221/src/products/hls/hls_lib/hlsmath/src/../include/internal/hls_round.h</first>
<second>generic_cast_IEEE754&lt;int, float&gt;</second>
</first>
<second>368</second>
</item>
<item>
<first>
<first>/wrk/2017.4/nightly/2017_12_15_2086221/src/products/hls/hls_lib/hlsmath/src/lib_floatconversion.cpp</first>
<second>__hls_fptosi_float_i32</second>
</first>
<second>49</second>
</item>
</second>
</item>
</inlineStackInfo>
<originalName>isNeg</originalName>
<rtlName>isNeg_fu_94_p3</rtlName>
<coreName/>
</Obj>
<bitwidth>1</bitwidth>
</Value>
<oprand_edges>
<count>3</count>
<item_version>0</item_version>
<item>58</item>
<item>59</item>
<item>61</item>
</oprand_edges>
<opcode>bitselect</opcode>
<m_Display>0</m_Display>
</item>
<item class_id_reference="9" object_id="_12">
<Value>
<Obj>
<type>0</type>
<id>12</id>
<name>tmp_5_i_i</name>
<fileName>/wrk/2017.4/nightly/2017_12_15_2086221/src/products/hls/hls_lib/hlsmath/src/../include/internal/hls_round.h</fileName>
<fileDirectory>../../../../../../../wrk/2017.4/nightly/2017_12_15_2086221/src/products</fileDirectory>
<lineNumber>286</lineNumber>
<contextFuncName>generic_cast_IEEE754&lt;int, 6, float&gt;</contextFuncName>
<inlineStackInfo>
<count>1</count>
<item_version>0</item_version>
<item>
<first>/wrk/2017.4/nightly/2017_12_15_2086221/src/products</first>
<second>
<count>3</count>
<item_version>0</item_version>
<item>
<first>
<first>/wrk/2017.4/nightly/2017_12_15_2086221/src/products/hls/hls_lib/hlsmath/src/../include/internal/hls_round.h</first>
<second>generic_cast_IEEE754&lt;int, 6, float&gt;</second>
</first>
<second>286</second>
</item>
<item>
<first>
<first>/wrk/2017.4/nightly/2017_12_15_2086221/src/products/hls/hls_lib/hlsmath/src/../include/internal/hls_round.h</first>
<second>generic_cast_IEEE754&lt;int, float&gt;</second>
</first>
<second>368</second>
</item>
<item>
<first>
<first>/wrk/2017.4/nightly/2017_12_15_2086221/src/products/hls/hls_lib/hlsmath/src/lib_floatconversion.cpp</first>
<second>__hls_fptosi_float_i32</second>
</first>
<second>49</second>
</item>
</second>
</item>
</inlineStackInfo>
<originalName/>
<rtlName>tmp_5_i_i_fu_102_p2</rtlName>
<coreName/>
</Obj>
<bitwidth>8</bitwidth>
</Value>
<oprand_edges>
<count>2</count>
<item_version>0</item_version>
<item>63</item>
<item>64</item>
</oprand_edges>
<opcode>sub</opcode>
<m_Display>0</m_Display>
</item>
<item class_id_reference="9" object_id="_13">
<Value>
<Obj>
<type>0</type>
<id>13</id>
<name>tmp_5_i_i_cast</name>
<fileName>/wrk/2017.4/nightly/2017_12_15_2086221/src/products/hls/hls_lib/hlsmath/src/../include/internal/hls_round.h</fileName>
<fileDirectory>../../../../../../../wrk/2017.4/nightly/2017_12_15_2086221/src/products</fileDirectory>
<lineNumber>286</lineNumber>
<contextFuncName>generic_cast_IEEE754&lt;int, 6, float&gt;</contextFuncName>
<inlineStackInfo>
<count>1</count>
<item_version>0</item_version>
<item>
<first>/wrk/2017.4/nightly/2017_12_15_2086221/src/products</first>
<second>
<count>3</count>
<item_version>0</item_version>
<item>
<first>
<first>/wrk/2017.4/nightly/2017_12_15_2086221/src/products/hls/hls_lib/hlsmath/src/../include/internal/hls_round.h</first>
<second>generic_cast_IEEE754&lt;int, 6, float&gt;</second>
</first>
<second>286</second>
</item>
<item>
<first>
<first>/wrk/2017.4/nightly/2017_12_15_2086221/src/products/hls/hls_lib/hlsmath/src/../include/internal/hls_round.h</first>
<second>generic_cast_IEEE754&lt;int, float&gt;</second>
</first>
<second>368</second>
</item>
<item>
<first>
<first>/wrk/2017.4/nightly/2017_12_15_2086221/src/products/hls/hls_lib/hlsmath/src/lib_floatconversion.cpp</first>
<second>__hls_fptosi_float_i32</second>
</first>
<second>49</second>
</item>
</second>
</item>
</inlineStackInfo>
<originalName/>
<rtlName>tmp_5_i_i_cast_fu_108_p1</rtlName>
<coreName/>
</Obj>
<bitwidth>9</bitwidth>
</Value>
<oprand_edges>
<count>1</count>
<item_version>0</item_version>
<item>65</item>
</oprand_edges>
<opcode>sext</opcode>
<m_Display>0</m_Display>
</item>
<item class_id_reference="9" object_id="_14">
<Value>
<Obj>
<type>0</type>
<id>14</id>
<name>sh_assign_1</name>
<fileName>/wrk/2017.4/nightly/2017_12_15_2086221/src/products/hls/hls_lib/hlsmath/src/../include/internal/hls_round.h</fileName>
<fileDirectory>../../../../../../../wrk/2017.4/nightly/2017_12_15_2086221/src/products</fileDirectory>
<lineNumber>286</lineNumber>
<contextFuncName>generic_cast_IEEE754&lt;int, 6, float&gt;</contextFuncName>
<inlineStackInfo>
<count>1</count>
<item_version>0</item_version>
<item>
<first>/wrk/2017.4/nightly/2017_12_15_2086221/src/products</first>
<second>
<count>3</count>
<item_version>0</item_version>
<item>
<first>
<first>/wrk/2017.4/nightly/2017_12_15_2086221/src/products/hls/hls_lib/hlsmath/src/../include/internal/hls_round.h</first>
<second>generic_cast_IEEE754&lt;int, 6, float&gt;</second>
</first>
<second>286</second>
</item>
<item>
<first>
<first>/wrk/2017.4/nightly/2017_12_15_2086221/src/products/hls/hls_lib/hlsmath/src/../include/internal/hls_round.h</first>
<second>generic_cast_IEEE754&lt;int, float&gt;</second>
</first>
<second>368</second>
</item>
<item>
<first>
<first>/wrk/2017.4/nightly/2017_12_15_2086221/src/products/hls/hls_lib/hlsmath/src/lib_floatconversion.cpp</first>
<second>__hls_fptosi_float_i32</second>
</first>
<second>49</second>
</item>
</second>
</item>
</inlineStackInfo>
<originalName>sh</originalName>
<rtlName>sh_assign_1_fu_112_p3</rtlName>
<coreName/>
</Obj>
<bitwidth>9</bitwidth>
</Value>
<oprand_edges>
<count>3</count>
<item_version>0</item_version>
<item>66</item>
<item>67</item>
<item>68</item>
</oprand_edges>
<opcode>select</opcode>
<m_Display>0</m_Display>
</item>
<item class_id_reference="9" object_id="_15">
<Value>
<Obj>
<type>0</type>
<id>15</id>
<name>sh_assign_1_cast</name>
<fileName>/wrk/2017.4/nightly/2017_12_15_2086221/src/products/hls/hls_lib/hlsmath/src/../include/internal/hls_round.h</fileName>
<fileDirectory>../../../../../../../wrk/2017.4/nightly/2017_12_15_2086221/src/products</fileDirectory>
<lineNumber>286</lineNumber>
<contextFuncName>generic_cast_IEEE754&lt;int, 6, float&gt;</contextFuncName>
<inlineStackInfo>
<count>1</count>
<item_version>0</item_version>
<item>
<first>/wrk/2017.4/nightly/2017_12_15_2086221/src/products</first>
<second>
<count>3</count>
<item_version>0</item_version>
<item>
<first>
<first>/wrk/2017.4/nightly/2017_12_15_2086221/src/products/hls/hls_lib/hlsmath/src/../include/internal/hls_round.h</first>
<second>generic_cast_IEEE754&lt;int, 6, float&gt;</second>
</first>
<second>286</second>
</item>
<item>
<first>
<first>/wrk/2017.4/nightly/2017_12_15_2086221/src/products/hls/hls_lib/hlsmath/src/../include/internal/hls_round.h</first>
<second>generic_cast_IEEE754&lt;int, float&gt;</second>
</first>
<second>368</second>
</item>
<item>
<first>
<first>/wrk/2017.4/nightly/2017_12_15_2086221/src/products/hls/hls_lib/hlsmath/src/lib_floatconversion.cpp</first>
<second>__hls_fptosi_float_i32</second>
</first>
<second>49</second>
</item>
</second>
</item>
</inlineStackInfo>
<originalName/>
<rtlName>sh_assign_1_cast_fu_120_p1</rtlName>
<coreName/>
</Obj>
<bitwidth>32</bitwidth>
</Value>
<oprand_edges>
<count>1</count>
<item_version>0</item_version>
<item>69</item>
</oprand_edges>
<opcode>sext</opcode>
<m_Display>0</m_Display>
</item>
<item class_id_reference="9" object_id="_16">
<Value>
<Obj>
<type>0</type>
<id>16</id>
<name>sh_assign_1_cast_cas</name>
<fileName>/wrk/2017.4/nightly/2017_12_15_2086221/src/products/hls/hls_lib/hlsmath/src/../include/internal/hls_round.h</fileName>
<fileDirectory>../../../../../../../wrk/2017.4/nightly/2017_12_15_2086221/src/products</fileDirectory>
<lineNumber>286</lineNumber>
<contextFuncName>generic_cast_IEEE754&lt;int, 6, float&gt;</contextFuncName>
<inlineStackInfo>
<count>1</count>
<item_version>0</item_version>
<item>
<first>/wrk/2017.4/nightly/2017_12_15_2086221/src/products</first>
<second>
<count>3</count>
<item_version>0</item_version>
<item>
<first>
<first>/wrk/2017.4/nightly/2017_12_15_2086221/src/products/hls/hls_lib/hlsmath/src/../include/internal/hls_round.h</first>
<second>generic_cast_IEEE754&lt;int, 6, float&gt;</second>
</first>
<second>286</second>
</item>
<item>
<first>
<first>/wrk/2017.4/nightly/2017_12_15_2086221/src/products/hls/hls_lib/hlsmath/src/../include/internal/hls_round.h</first>
<second>generic_cast_IEEE754&lt;int, float&gt;</second>
</first>
<second>368</second>
</item>
<item>
<first>
<first>/wrk/2017.4/nightly/2017_12_15_2086221/src/products/hls/hls_lib/hlsmath/src/lib_floatconversion.cpp</first>
<second>__hls_fptosi_float_i32</second>
</first>
<second>49</second>
</item>
</second>
</item>
</inlineStackInfo>
<originalName/>
<rtlName>sh_assign_1_cast_cas_fu_124_p1</rtlName>
<coreName/>
</Obj>
<bitwidth>25</bitwidth>
</Value>
<oprand_edges>
<count>1</count>
<item_version>0</item_version>
<item>70</item>
</oprand_edges>
<opcode>sext</opcode>
<m_Display>0</m_Display>
</item>
<item class_id_reference="9" object_id="_17">
<Value>
<Obj>
<type>0</type>
<id>17</id>
<name>tmp_7_i_i</name>
<fileName>/wrk/2017.4/nightly/2017_12_15_2086221/src/products/hls/hls_lib/hlsmath/src/../include/internal/hls_round.h</fileName>
<fileDirectory>../../../../../../../wrk/2017.4/nightly/2017_12_15_2086221/src/products</fileDirectory>
<lineNumber>286</lineNumber>
<contextFuncName>generic_cast_IEEE754&lt;int, 6, float&gt;</contextFuncName>
<inlineStackInfo>
<count>1</count>
<item_version>0</item_version>
<item>
<first>/wrk/2017.4/nightly/2017_12_15_2086221/src/products</first>
<second>
<count>3</count>
<item_version>0</item_version>
<item>
<first>
<first>/wrk/2017.4/nightly/2017_12_15_2086221/src/products/hls/hls_lib/hlsmath/src/../include/internal/hls_round.h</first>
<second>generic_cast_IEEE754&lt;int, 6, float&gt;</second>
</first>
<second>286</second>
</item>
<item>
<first>
<first>/wrk/2017.4/nightly/2017_12_15_2086221/src/products/hls/hls_lib/hlsmath/src/../include/internal/hls_round.h</first>
<second>generic_cast_IEEE754&lt;int, float&gt;</second>
</first>
<second>368</second>
</item>
<item>
<first>
<first>/wrk/2017.4/nightly/2017_12_15_2086221/src/products/hls/hls_lib/hlsmath/src/lib_floatconversion.cpp</first>
<second>__hls_fptosi_float_i32</second>
</first>
<second>49</second>
</item>
</second>
</item>
</inlineStackInfo>
<originalName/>
<rtlName>tmp_7_i_i_fu_128_p1</rtlName>
<coreName/>
</Obj>
<bitwidth>79</bitwidth>
</Value>
<oprand_edges>
<count>1</count>
<item_version>0</item_version>
<item>71</item>
</oprand_edges>
<opcode>zext</opcode>
<m_Display>0</m_Display>
</item>
<item class_id_reference="9" object_id="_18">
<Value>
<Obj>
<type>0</type>
<id>18</id>
<name>tmp_8_i_i</name>
<fileName>/wrk/2017.4/nightly/2017_12_15_2086221/src/products/hls/hls_lib/hlsmath/src/../include/internal/hls_round.h</fileName>
<fileDirectory>../../../../../../../wrk/2017.4/nightly/2017_12_15_2086221/src/products</fileDirectory>
<lineNumber>286</lineNumber>
<contextFuncName>generic_cast_IEEE754&lt;int, 6, float&gt;</contextFuncName>
<inlineStackInfo>
<count>1</count>
<item_version>0</item_version>
<item>
<first>/wrk/2017.4/nightly/2017_12_15_2086221/src/products</first>
<second>
<count>3</count>
<item_version>0</item_version>
<item>
<first>
<first>/wrk/2017.4/nightly/2017_12_15_2086221/src/products/hls/hls_lib/hlsmath/src/../include/internal/hls_round.h</first>
<second>generic_cast_IEEE754&lt;int, 6, float&gt;</second>
</first>
<second>286</second>
</item>
<item>
<first>
<first>/wrk/2017.4/nightly/2017_12_15_2086221/src/products/hls/hls_lib/hlsmath/src/../include/internal/hls_round.h</first>
<second>generic_cast_IEEE754&lt;int, float&gt;</second>
</first>
<second>368</second>
</item>
<item>
<first>
<first>/wrk/2017.4/nightly/2017_12_15_2086221/src/products/hls/hls_lib/hlsmath/src/lib_floatconversion.cpp</first>
<second>__hls_fptosi_float_i32</second>
</first>
<second>49</second>
</item>
</second>
</item>
</inlineStackInfo>
<originalName/>
<rtlName>tmp_8_i_i_fu_132_p2</rtlName>
<coreName/>
</Obj>
<bitwidth>25</bitwidth>
</Value>
<oprand_edges>
<count>2</count>
<item_version>0</item_version>
<item>72</item>
<item>73</item>
</oprand_edges>
<opcode>lshr</opcode>
<m_Display>0</m_Display>
</item>
<item class_id_reference="9" object_id="_19">
<Value>
<Obj>
<type>0</type>
<id>19</id>
<name>tmp_i_i</name>
<fileName>/wrk/2017.4/nightly/2017_12_15_2086221/src/products/hls/hls_lib/hlsmath/src/../include/internal/hls_round.h</fileName>
<fileDirectory>../../../../../../../wrk/2017.4/nightly/2017_12_15_2086221/src/products</fileDirectory>
<lineNumber>286</lineNumber>
<contextFuncName>generic_cast_IEEE754&lt;int, 6, float&gt;</contextFuncName>
<inlineStackInfo>
<count>1</count>
<item_version>0</item_version>
<item>
<first>/wrk/2017.4/nightly/2017_12_15_2086221/src/products</first>
<second>
<count>3</count>
<item_version>0</item_version>
<item>
<first>
<first>/wrk/2017.4/nightly/2017_12_15_2086221/src/products/hls/hls_lib/hlsmath/src/../include/internal/hls_round.h</first>
<second>generic_cast_IEEE754&lt;int, 6, float&gt;</second>
</first>
<second>286</second>
</item>
<item>
<first>
<first>/wrk/2017.4/nightly/2017_12_15_2086221/src/products/hls/hls_lib/hlsmath/src/../include/internal/hls_round.h</first>
<second>generic_cast_IEEE754&lt;int, float&gt;</second>
</first>
<second>368</second>
</item>
<item>
<first>
<first>/wrk/2017.4/nightly/2017_12_15_2086221/src/products/hls/hls_lib/hlsmath/src/lib_floatconversion.cpp</first>
<second>__hls_fptosi_float_i32</second>
</first>
<second>49</second>
</item>
</second>
</item>
</inlineStackInfo>
<originalName/>
<rtlName>tmp_i_i_fu_138_p2</rtlName>
<coreName/>
</Obj>
<bitwidth>79</bitwidth>
</Value>
<oprand_edges>
<count>2</count>
<item_version>0</item_version>
<item>74</item>
<item>75</item>
</oprand_edges>
<opcode>shl</opcode>
<m_Display>0</m_Display>
</item>
<item class_id_reference="9" object_id="_20">
<Value>
<Obj>
<type>0</type>
<id>20</id>
<name>tmp</name>
<fileName>/wrk/2017.4/nightly/2017_12_15_2086221/src/products/hls/hls_lib/hlsmath/src/../include/internal/hls_round.h</fileName>
<fileDirectory>../../../../../../../wrk/2017.4/nightly/2017_12_15_2086221/src/products</fileDirectory>
<lineNumber>289</lineNumber>
<contextFuncName>generic_cast_IEEE754&lt;int, 6, float&gt;</contextFuncName>
<inlineStackInfo>
<count>1</count>
<item_version>0</item_version>
<item>
<first>/wrk/2017.4/nightly/2017_12_15_2086221/src/products</first>
<second>
<count>3</count>
<item_version>0</item_version>
<item>
<first>
<first>/wrk/2017.4/nightly/2017_12_15_2086221/src/products/hls/hls_lib/hlsmath/src/../include/internal/hls_round.h</first>
<second>generic_cast_IEEE754&lt;int, 6, float&gt;</second>
</first>
<second>289</second>
</item>
<item>
<first>
<first>/wrk/2017.4/nightly/2017_12_15_2086221/src/products/hls/hls_lib/hlsmath/src/../include/internal/hls_round.h</first>
<second>generic_cast_IEEE754&lt;int, float&gt;</second>
</first>
<second>368</second>
</item>
<item>
<first>
<first>/wrk/2017.4/nightly/2017_12_15_2086221/src/products/hls/hls_lib/hlsmath/src/lib_floatconversion.cpp</first>
<second>__hls_fptosi_float_i32</second>
</first>
<second>49</second>
</item>
</second>
</item>
</inlineStackInfo>
<originalName/>
<rtlName>tmp_fu_144_p3</rtlName>
<coreName/>
</Obj>
<bitwidth>1</bitwidth>
</Value>
<oprand_edges>
<count>3</count>
<item_version>0</item_version>
<item>77</item>
<item>78</item>
<item>80</item>
</oprand_edges>
<opcode>bitselect</opcode>
<m_Display>0</m_Display>
</item>
<item class_id_reference="9" object_id="_21">
<Value>
<Obj>
<type>0</type>
<id>21</id>
<name>tmp_13</name>
<fileName>/wrk/2017.4/nightly/2017_12_15_2086221/src/products/hls/hls_lib/hlsmath/src/../include/internal/hls_round.h</fileName>
<fileDirectory>../../../../../../../wrk/2017.4/nightly/2017_12_15_2086221/src/products</fileDirectory>
<lineNumber>289</lineNumber>
<contextFuncName>generic_cast_IEEE754&lt;int, 6, float&gt;</contextFuncName>
<inlineStackInfo>
<count>1</count>
<item_version>0</item_version>
<item>
<first>/wrk/2017.4/nightly/2017_12_15_2086221/src/products</first>
<second>
<count>3</count>
<item_version>0</item_version>
<item>
<first>
<first>/wrk/2017.4/nightly/2017_12_15_2086221/src/products/hls/hls_lib/hlsmath/src/../include/internal/hls_round.h</first>
<second>generic_cast_IEEE754&lt;int, 6, float&gt;</second>
</first>
<second>289</second>
</item>
<item>
<first>
<first>/wrk/2017.4/nightly/2017_12_15_2086221/src/products/hls/hls_lib/hlsmath/src/../include/internal/hls_round.h</first>
<second>generic_cast_IEEE754&lt;int, float&gt;</second>
</first>
<second>368</second>
</item>
<item>
<first>
<first>/wrk/2017.4/nightly/2017_12_15_2086221/src/products/hls/hls_lib/hlsmath/src/lib_floatconversion.cpp</first>
<second>__hls_fptosi_float_i32</second>
</first>
<second>49</second>
</item>
</second>
</item>
</inlineStackInfo>
<originalName/>
<rtlName>tmp_13_fu_152_p1</rtlName>
<coreName/>
</Obj>
<bitwidth>32</bitwidth>
</Value>
<oprand_edges>
<count>1</count>
<item_version>0</item_version>
<item>81</item>
</oprand_edges>
<opcode>zext</opcode>
<m_Display>0</m_Display>
</item>
<item class_id_reference="9" object_id="_22">
<Value>
<Obj>
<type>0</type>
<id>22</id>
<name>tmp_14</name>
<fileName>/wrk/2017.4/nightly/2017_12_15_2086221/src/products/hls/hls_lib/hlsmath/src/../include/internal/hls_round.h</fileName>
<fileDirectory>../../../../../../../wrk/2017.4/nightly/2017_12_15_2086221/src/products</fileDirectory>
<lineNumber>289</lineNumber>
<contextFuncName>generic_cast_IEEE754&lt;int, 6, float&gt;</contextFuncName>
<inlineStackInfo>
<count>1</count>
<item_version>0</item_version>
<item>
<first>/wrk/2017.4/nightly/2017_12_15_2086221/src/products</first>
<second>
<count>3</count>
<item_version>0</item_version>
<item>
<first>
<first>/wrk/2017.4/nightly/2017_12_15_2086221/src/products/hls/hls_lib/hlsmath/src/../include/internal/hls_round.h</first>
<second>generic_cast_IEEE754&lt;int, 6, float&gt;</second>
</first>
<second>289</second>
</item>
<item>
<first>
<first>/wrk/2017.4/nightly/2017_12_15_2086221/src/products/hls/hls_lib/hlsmath/src/../include/internal/hls_round.h</first>
<second>generic_cast_IEEE754&lt;int, float&gt;</second>
</first>
<second>368</second>
</item>
<item>
<first>
<first>/wrk/2017.4/nightly/2017_12_15_2086221/src/products/hls/hls_lib/hlsmath/src/lib_floatconversion.cpp</first>
<second>__hls_fptosi_float_i32</second>
</first>
<second>49</second>
</item>
</second>
</item>
</inlineStackInfo>
<originalName/>
<rtlName>tmp_14_fu_156_p4</rtlName>
<coreName/>
</Obj>
<bitwidth>32</bitwidth>
</Value>
<oprand_edges>
<count>4</count>
<item_version>0</item_version>
<item>83</item>
<item>84</item>
<item>85</item>
<item>87</item>
</oprand_edges>
<opcode>partselect</opcode>
<m_Display>0</m_Display>
</item>
<item class_id_reference="9" object_id="_23">
<Value>
<Obj>
<type>0</type>
<id>23</id>
<name>p_Val2_2</name>
<fileName>/wrk/2017.4/nightly/2017_12_15_2086221/src/products/hls/hls_lib/hlsmath/src/../include/internal/hls_round.h</fileName>
<fileDirectory>../../../../../../../wrk/2017.4/nightly/2017_12_15_2086221/src/products</fileDirectory>
<lineNumber>286</lineNumber>
<contextFuncName>generic_cast_IEEE754&lt;int, 6, float&gt;</contextFuncName>
<inlineStackInfo>
<count>1</count>
<item_version>0</item_version>
<item>
<first>/wrk/2017.4/nightly/2017_12_15_2086221/src/products</first>
<second>
<count>3</count>
<item_version>0</item_version>
<item>
<first>
<first>/wrk/2017.4/nightly/2017_12_15_2086221/src/products/hls/hls_lib/hlsmath/src/../include/internal/hls_round.h</first>
<second>generic_cast_IEEE754&lt;int, 6, float&gt;</second>
</first>
<second>286</second>
</item>
<item>
<first>
<first>/wrk/2017.4/nightly/2017_12_15_2086221/src/products/hls/hls_lib/hlsmath/src/../include/internal/hls_round.h</first>
<second>generic_cast_IEEE754&lt;int, float&gt;</second>
</first>
<second>368</second>
</item>
<item>
<first>
<first>/wrk/2017.4/nightly/2017_12_15_2086221/src/products/hls/hls_lib/hlsmath/src/lib_floatconversion.cpp</first>
<second>__hls_fptosi_float_i32</second>
</first>
<second>49</second>
</item>
</second>
</item>
</inlineStackInfo>
<originalName>__Val2__</originalName>
<rtlName>p_Val2_2_fu_166_p3</rtlName>
<coreName/>
</Obj>
<bitwidth>32</bitwidth>
</Value>
<oprand_edges>
<count>3</count>
<item_version>0</item_version>
<item>88</item>
<item>89</item>
<item>90</item>
</oprand_edges>
<opcode>select</opcode>
<m_Display>0</m_Display>
</item>
<item class_id_reference="9" object_id="_24">
<Value>
<Obj>
<type>0</type>
<id>24</id>
<name>p_Val2_6_i_i</name>
<fileName>/wrk/2017.4/nightly/2017_12_15_2086221/src/products/hls/hls_lib/hlsmath/src/../include/internal/hls_round.h</fileName>
<fileDirectory>../../../../../../../wrk/2017.4/nightly/2017_12_15_2086221/src/products</fileDirectory>
<lineNumber>318</lineNumber>
<contextFuncName>generic_cast_IEEE754&lt;int, 6, float&gt;</contextFuncName>
<inlineStackInfo>
<count>1</count>
<item_version>0</item_version>
<item>
<first>/wrk/2017.4/nightly/2017_12_15_2086221/src/products</first>
<second>
<count>3</count>
<item_version>0</item_version>
<item>
<first>
<first>/wrk/2017.4/nightly/2017_12_15_2086221/src/products/hls/hls_lib/hlsmath/src/../include/internal/hls_round.h</first>
<second>generic_cast_IEEE754&lt;int, 6, float&gt;</second>
</first>
<second>318</second>
</item>
<item>
<first>
<first>/wrk/2017.4/nightly/2017_12_15_2086221/src/products/hls/hls_lib/hlsmath/src/../include/internal/hls_round.h</first>
<second>generic_cast_IEEE754&lt;int, float&gt;</second>
</first>
<second>368</second>
</item>
<item>
<first>
<first>/wrk/2017.4/nightly/2017_12_15_2086221/src/products/hls/hls_lib/hlsmath/src/lib_floatconversion.cpp</first>
<second>__hls_fptosi_float_i32</second>
</first>
<second>49</second>
</item>
</second>
</item>
</inlineStackInfo>
<originalName/>
<rtlName>p_Val2_6_i_i_fu_174_p2</rtlName>
<coreName/>
</Obj>
<bitwidth>32</bitwidth>
</Value>
<oprand_edges>
<count>2</count>
<item_version>0</item_version>
<item>92</item>
<item>93</item>
</oprand_edges>
<opcode>sub</opcode>
<m_Display>0</m_Display>
</item>
<item class_id_reference="9" object_id="_25">
<Value>
<Obj>
<type>0</type>
<id>25</id>
<name>p_Val2_4</name>
<fileName>/wrk/2017.4/nightly/2017_12_15_2086221/src/products/hls/hls_lib/hlsmath/src/../include/internal/hls_round.h</fileName>
<fileDirectory>../../../../../../../wrk/2017.4/nightly/2017_12_15_2086221/src/products</fileDirectory>
<lineNumber>318</lineNumber>
<contextFuncName>generic_cast_IEEE754&lt;int, 6, float&gt;</contextFuncName>
<inlineStackInfo>
<count>1</count>
<item_version>0</item_version>
<item>
<first>/wrk/2017.4/nightly/2017_12_15_2086221/src/products</first>
<second>
<count>3</count>
<item_version>0</item_version>
<item>
<first>
<first>/wrk/2017.4/nightly/2017_12_15_2086221/src/products/hls/hls_lib/hlsmath/src/../include/internal/hls_round.h</first>
<second>generic_cast_IEEE754&lt;int, 6, float&gt;</second>
</first>
<second>318</second>
</item>
<item>
<first>
<first>/wrk/2017.4/nightly/2017_12_15_2086221/src/products/hls/hls_lib/hlsmath/src/../include/internal/hls_round.h</first>
<second>generic_cast_IEEE754&lt;int, float&gt;</second>
</first>
<second>368</second>
</item>
<item>
<first>
<first>/wrk/2017.4/nightly/2017_12_15_2086221/src/products/hls/hls_lib/hlsmath/src/lib_floatconversion.cpp</first>
<second>__hls_fptosi_float_i32</second>
</first>
<second>49</second>
</item>
</second>
</item>
</inlineStackInfo>
<originalName>__Val2__</originalName>
<rtlName>ap_return</rtlName>
<coreName/>
</Obj>
<bitwidth>32</bitwidth>
</Value>
<oprand_edges>
<count>3</count>
<item_version>0</item_version>
<item>94</item>
<item>95</item>
<item>96</item>
</oprand_edges>
<opcode>select</opcode>
<m_Display>0</m_Display>
</item>
<item class_id_reference="9" object_id="_26">
<Value>
<Obj>
<type>0</type>
<id>26</id>
<name/>
<fileName>/wrk/2017.4/nightly/2017_12_15_2086221/src/products/hls/hls_lib/hlsmath/src/lib_floatconversion.cpp</fileName>
<fileDirectory>../../../../../../../wrk/2017.4/nightly/2017_12_15_2086221/src/products</fileDirectory>
<lineNumber>49</lineNumber>
<contextFuncName>__hls_fptosi_float_i32</contextFuncName>
<inlineStackInfo>
<count>1</count>
<item_version>0</item_version>
<item>
<first>/wrk/2017.4/nightly/2017_12_15_2086221/src/products</first>
<second>
<count>1</count>
<item_version>0</item_version>
<item>
<first>
<first>/wrk/2017.4/nightly/2017_12_15_2086221/src/products/hls/hls_lib/hlsmath/src/lib_floatconversion.cpp</first>
<second>__hls_fptosi_float_i32</second>
</first>
<second>49</second>
</item>
</second>
</item>
</inlineStackInfo>
<originalName/>
<rtlName/>
<coreName/>
</Obj>
<bitwidth>0</bitwidth>
</Value>
<oprand_edges>
<count>1</count>
<item_version>0</item_version>
<item>97</item>
</oprand_edges>
<opcode>ret</opcode>
<m_Display>0</m_Display>
</item>
</nodes>
<consts class_id="15" tracking_level="0" version="0">
<count>11</count>
<item_version>0</item_version>
<item class_id="16" tracking_level="1" version="0" object_id="_27">
<Value>
<Obj>
<type>2</type>
<id>35</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>32</bitwidth>
</Value>
<const_type>0</const_type>
<content>31</content>
</item>
<item class_id_reference="16" object_id="_28">
<Value>
<Obj>
<type>2</type>
<id>40</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>32</bitwidth>
</Value>
<const_type>0</const_type>
<content>23</content>
</item>
<item class_id_reference="16" object_id="_29">
<Value>
<Obj>
<type>2</type>
<id>42</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>32</bitwidth>
</Value>
<const_type>0</const_type>
<content>30</content>
</item>
<item class_id_reference="16" object_id="_30">
<Value>
<Obj>
<type>2</type>
<id>47</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>1</bitwidth>
</Value>
<const_type>0</const_type>
<content>1</content>
</item>
<item class_id_reference="16" object_id="_31">
<Value>
<Obj>
<type>2</type>
<id>50</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>1</bitwidth>
</Value>
<const_type>0</const_type>
<content>0</content>
</item>
<item class_id_reference="16" object_id="_32">
<Value>
<Obj>
<type>2</type>
<id>54</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>9</bitwidth>
</Value>
<const_type>0</const_type>
<content>385</content>
</item>
<item class_id_reference="16" object_id="_33">
<Value>
<Obj>
<type>2</type>
<id>60</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>32</bitwidth>
</Value>
<const_type>0</const_type>
<content>8</content>
</item>
<item class_id_reference="16" object_id="_34">
<Value>
<Obj>
<type>2</type>
<id>62</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>8</bitwidth>
</Value>
<const_type>0</const_type>
<content>127</content>
</item>
<item class_id_reference="16" object_id="_35">
<Value>
<Obj>
<type>2</type>
<id>79</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>32</bitwidth>
</Value>
<const_type>0</const_type>
<content>24</content>
</item>
<item class_id_reference="16" object_id="_36">
<Value>
<Obj>
<type>2</type>
<id>86</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>32</bitwidth>
</Value>
<const_type>0</const_type>
<content>55</content>
</item>
<item class_id_reference="16" object_id="_37">
<Value>
<Obj>
<type>2</type>
<id>91</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>32</bitwidth>
</Value>
<const_type>0</const_type>
<content>0</content>
</item>
</consts>
<blocks class_id="17" tracking_level="0" version="0">
<count>1</count>
<item_version>0</item_version>
<item class_id="18" tracking_level="1" version="0" object_id="_38">
<Obj>
<type>3</type>
<id>27</id>
<name>__hls_fptosi_float_i</name>
<fileName/>
<fileDirectory/>
<lineNumber>0</lineNumber>
<contextFuncName/>
<inlineStackInfo>
<count>0</count>
<item_version>0</item_version>
</inlineStackInfo>
<originalName/>
<rtlName/>
<coreName/>
</Obj>
<node_objs>
<count>25</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>
<item>11</item>
<item>12</item>
<item>13</item>
<item>14</item>
<item>15</item>
<item>16</item>
<item>17</item>
<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>
</node_objs>
</item>
</blocks>
<edges class_id="19" tracking_level="0" version="0">
<count>45</count>
<item_version>0</item_version>
<item class_id="20" tracking_level="1" version="0" object_id="_39">
<id>30</id>
<edge_type>1</edge_type>
<source_obj>1</source_obj>
<sink_obj>2</sink_obj>
</item>
<item class_id_reference="20" object_id="_40">
<id>31</id>
<edge_type>1</edge_type>
<source_obj>2</source_obj>
<sink_obj>3</sink_obj>
</item>
<item class_id_reference="20" object_id="_41">
<id>34</id>
<edge_type>1</edge_type>
<source_obj>3</source_obj>
<sink_obj>4</sink_obj>
</item>
<item class_id_reference="20" object_id="_42">
<id>36</id>
<edge_type>1</edge_type>
<source_obj>35</source_obj>
<sink_obj>4</sink_obj>
</item>
<item class_id_reference="20" object_id="_43">
<id>39</id>
<edge_type>1</edge_type>
<source_obj>3</source_obj>
<sink_obj>5</sink_obj>
</item>
<item class_id_reference="20" object_id="_44">
<id>41</id>
<edge_type>1</edge_type>
<source_obj>40</source_obj>
<sink_obj>5</sink_obj>
</item>
<item class_id_reference="20" object_id="_45">
<id>43</id>
<edge_type>1</edge_type>
<source_obj>42</source_obj>
<sink_obj>5</sink_obj>
</item>
<item class_id_reference="20" object_id="_46">
<id>44</id>
<edge_type>1</edge_type>
<source_obj>3</source_obj>
<sink_obj>6</sink_obj>
</item>
<item class_id_reference="20" object_id="_47">
<id>48</id>
<edge_type>1</edge_type>
<source_obj>47</source_obj>
<sink_obj>7</sink_obj>
</item>
<item class_id_reference="20" object_id="_48">
<id>49</id>
<edge_type>1</edge_type>
<source_obj>6</source_obj>
<sink_obj>7</sink_obj>
</item>
<item class_id_reference="20" object_id="_49">
<id>51</id>
<edge_type>1</edge_type>
<source_obj>50</source_obj>
<sink_obj>7</sink_obj>
</item>
<item class_id_reference="20" object_id="_50">
<id>52</id>
<edge_type>1</edge_type>
<source_obj>7</source_obj>
<sink_obj>8</sink_obj>
</item>
<item class_id_reference="20" object_id="_51">
<id>53</id>
<edge_type>1</edge_type>
<source_obj>5</source_obj>
<sink_obj>9</sink_obj>
</item>
<item class_id_reference="20" object_id="_52">
<id>55</id>
<edge_type>1</edge_type>
<source_obj>54</source_obj>
<sink_obj>10</sink_obj>
</item>
<item class_id_reference="20" object_id="_53">
<id>56</id>
<edge_type>1</edge_type>
<source_obj>9</source_obj>
<sink_obj>10</sink_obj>
</item>
<item class_id_reference="20" object_id="_54">
<id>59</id>
<edge_type>1</edge_type>
<source_obj>10</source_obj>
<sink_obj>11</sink_obj>
</item>
<item class_id_reference="20" object_id="_55">
<id>61</id>
<edge_type>1</edge_type>
<source_obj>60</source_obj>
<sink_obj>11</sink_obj>
</item>
<item class_id_reference="20" object_id="_56">
<id>63</id>
<edge_type>1</edge_type>
<source_obj>62</source_obj>
<sink_obj>12</sink_obj>
</item>
<item class_id_reference="20" object_id="_57">
<id>64</id>
<edge_type>1</edge_type>
<source_obj>5</source_obj>
<sink_obj>12</sink_obj>
</item>
<item class_id_reference="20" object_id="_58">
<id>65</id>
<edge_type>1</edge_type>
<source_obj>12</source_obj>
<sink_obj>13</sink_obj>
</item>
<item class_id_reference="20" object_id="_59">
<id>66</id>
<edge_type>1</edge_type>
<source_obj>11</source_obj>
<sink_obj>14</sink_obj>
</item>
<item class_id_reference="20" object_id="_60">
<id>67</id>
<edge_type>1</edge_type>
<source_obj>13</source_obj>
<sink_obj>14</sink_obj>
</item>
<item class_id_reference="20" object_id="_61">
<id>68</id>
<edge_type>1</edge_type>
<source_obj>10</source_obj>
<sink_obj>14</sink_obj>
</item>
<item class_id_reference="20" object_id="_62">
<id>69</id>
<edge_type>1</edge_type>
<source_obj>14</source_obj>
<sink_obj>15</sink_obj>
</item>
<item class_id_reference="20" object_id="_63">
<id>70</id>
<edge_type>1</edge_type>
<source_obj>14</source_obj>
<sink_obj>16</sink_obj>
</item>
<item class_id_reference="20" object_id="_64">
<id>71</id>
<edge_type>1</edge_type>
<source_obj>15</source_obj>
<sink_obj>17</sink_obj>
</item>
<item class_id_reference="20" object_id="_65">
<id>72</id>
<edge_type>1</edge_type>
<source_obj>7</source_obj>
<sink_obj>18</sink_obj>
</item>
<item class_id_reference="20" object_id="_66">
<id>73</id>
<edge_type>1</edge_type>
<source_obj>16</source_obj>
<sink_obj>18</sink_obj>
</item>
<item class_id_reference="20" object_id="_67">
<id>74</id>
<edge_type>1</edge_type>
<source_obj>8</source_obj>
<sink_obj>19</sink_obj>
</item>
<item class_id_reference="20" object_id="_68">
<id>75</id>
<edge_type>1</edge_type>
<source_obj>17</source_obj>
<sink_obj>19</sink_obj>
</item>
<item class_id_reference="20" object_id="_69">
<id>78</id>
<edge_type>1</edge_type>
<source_obj>18</source_obj>
<sink_obj>20</sink_obj>
</item>
<item class_id_reference="20" object_id="_70">
<id>80</id>
<edge_type>1</edge_type>
<source_obj>79</source_obj>
<sink_obj>20</sink_obj>
</item>
<item class_id_reference="20" object_id="_71">
<id>81</id>
<edge_type>1</edge_type>
<source_obj>20</source_obj>
<sink_obj>21</sink_obj>
</item>
<item class_id_reference="20" object_id="_72">
<id>84</id>
<edge_type>1</edge_type>
<source_obj>19</source_obj>
<sink_obj>22</sink_obj>
</item>
<item class_id_reference="20" object_id="_73">
<id>85</id>
<edge_type>1</edge_type>
<source_obj>79</source_obj>
<sink_obj>22</sink_obj>
</item>
<item class_id_reference="20" object_id="_74">
<id>87</id>
<edge_type>1</edge_type>
<source_obj>86</source_obj>
<sink_obj>22</sink_obj>
</item>
<item class_id_reference="20" object_id="_75">
<id>88</id>
<edge_type>1</edge_type>
<source_obj>11</source_obj>
<sink_obj>23</sink_obj>
</item>
<item class_id_reference="20" object_id="_76">
<id>89</id>
<edge_type>1</edge_type>
<source_obj>21</source_obj>
<sink_obj>23</sink_obj>
</item>
<item class_id_reference="20" object_id="_77">
<id>90</id>
<edge_type>1</edge_type>
<source_obj>22</source_obj>
<sink_obj>23</sink_obj>
</item>
<item class_id_reference="20" object_id="_78">
<id>92</id>
<edge_type>1</edge_type>
<source_obj>91</source_obj>
<sink_obj>24</sink_obj>
</item>
<item class_id_reference="20" object_id="_79">
<id>93</id>
<edge_type>1</edge_type>
<source_obj>23</source_obj>
<sink_obj>24</sink_obj>
</item>
<item class_id_reference="20" object_id="_80">
<id>94</id>
<edge_type>1</edge_type>
<source_obj>4</source_obj>
<sink_obj>25</sink_obj>
</item>
<item class_id_reference="20" object_id="_81">
<id>95</id>
<edge_type>1</edge_type>
<source_obj>24</source_obj>
<sink_obj>25</sink_obj>
</item>
<item class_id_reference="20" object_id="_82">
<id>96</id>
<edge_type>1</edge_type>
<source_obj>23</source_obj>
<sink_obj>25</sink_obj>
</item>
<item class_id_reference="20" object_id="_83">
<id>97</id>
<edge_type>1</edge_type>
<source_obj>25</source_obj>
<sink_obj>26</sink_obj>
</item>
</edges>
</cdfg>
<cdfg_regions class_id="21" tracking_level="0" version="0">
<count>1</count>
<item_version>0</item_version>
<item class_id="22" tracking_level="1" version="0" object_id="_84">
<mId>1</mId>
<mTag>__hls_fptosi_float_i</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>27</item>
</basic_blocks>
<mII>1</mII>
<mDepth>2</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="24" tracking_level="1" version="0" object_id="_85">
<states class_id="25" tracking_level="0" version="0">
<count>2</count>
<item_version>0</item_version>
<item class_id="26" tracking_level="1" version="0" object_id="_86">
<id>1</id>
<operations class_id="27" tracking_level="0" version="0">
<count>22</count>
<item_version>0</item_version>
<item class_id="28" tracking_level="1" version="0" object_id="_87">
<id>2</id>
<stage>1</stage>
<latency>1</latency>
</item>
<item class_id_reference="28" object_id="_88">
<id>3</id>
<stage>1</stage>
<latency>1</latency>
</item>
<item class_id_reference="28" object_id="_89">
<id>4</id>
<stage>1</stage>
<latency>1</latency>
</item>
<item class_id_reference="28" object_id="_90">
<id>5</id>
<stage>1</stage>
<latency>1</latency>
</item>
<item class_id_reference="28" object_id="_91">
<id>6</id>
<stage>1</stage>
<latency>1</latency>
</item>
<item class_id_reference="28" object_id="_92">
<id>7</id>
<stage>1</stage>
<latency>1</latency>
</item>
<item class_id_reference="28" object_id="_93">
<id>8</id>
<stage>1</stage>
<latency>1</latency>
</item>
<item class_id_reference="28" object_id="_94">
<id>9</id>
<stage>1</stage>
<latency>1</latency>
</item>
<item class_id_reference="28" object_id="_95">
<id>10</id>
<stage>1</stage>
<latency>1</latency>
</item>
<item class_id_reference="28" object_id="_96">
<id>11</id>
<stage>1</stage>
<latency>1</latency>
</item>
<item class_id_reference="28" object_id="_97">
<id>12</id>
<stage>1</stage>
<latency>1</latency>
</item>
<item class_id_reference="28" object_id="_98">
<id>13</id>
<stage>1</stage>
<latency>1</latency>
</item>
<item class_id_reference="28" object_id="_99">
<id>14</id>
<stage>1</stage>
<latency>1</latency>
</item>
<item class_id_reference="28" object_id="_100">
<id>15</id>
<stage>1</stage>
<latency>1</latency>
</item>
<item class_id_reference="28" object_id="_101">
<id>16</id>
<stage>1</stage>
<latency>1</latency>
</item>
<item class_id_reference="28" object_id="_102">
<id>17</id>
<stage>1</stage>
<latency>1</latency>
</item>
<item class_id_reference="28" object_id="_103">
<id>18</id>
<stage>1</stage>
<latency>1</latency>
</item>
<item class_id_reference="28" object_id="_104">
<id>19</id>
<stage>1</stage>
<latency>1</latency>
</item>
<item class_id_reference="28" object_id="_105">
<id>20</id>
<stage>1</stage>
<latency>1</latency>
</item>
<item class_id_reference="28" object_id="_106">
<id>21</id>
<stage>1</stage>
<latency>1</latency>
</item>
<item class_id_reference="28" object_id="_107">
<id>22</id>
<stage>1</stage>
<latency>1</latency>
</item>
<item class_id_reference="28" object_id="_108">
<id>23</id>
<stage>1</stage>
<latency>1</latency>
</item>
</operations>
</item>
<item class_id_reference="26" object_id="_109">
<id>2</id>
<operations>
<count>3</count>
<item_version>0</item_version>
<item class_id_reference="28" object_id="_110">
<id>24</id>
<stage>1</stage>
<latency>1</latency>
</item>
<item class_id_reference="28" object_id="_111">
<id>25</id>
<stage>1</stage>
<latency>1</latency>
</item>
<item class_id_reference="28" object_id="_112">
<id>26</id>
<stage>1</stage>
<latency>1</latency>
</item>
</operations>
</item>
</states>
<transitions class_id="29" tracking_level="0" version="0">
<count>1</count>
<item_version>0</item_version>
<item class_id="30" tracking_level="1" version="0" object_id="_113">
<inState>1</inState>
<outState>2</outState>
<condition class_id="31" tracking_level="0" version="0">
<id>24</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>
</transitions>
</fsm>
<res class_id="34" tracking_level="1" version="0" object_id="_114">
<dp_component_resource class_id="35" tracking_level="0" version="0">
<count>0</count>
<item_version>0</item_version>
</dp_component_resource>
<dp_expression_resource>
<count>8</count>
<item_version>0</item_version>
<item class_id="36" tracking_level="0" version="0">
<first>ap_return ( select ) </first>
<second class_id="37" tracking_level="0" version="0">
<count>5</count>
<item_version>0</item_version>
<item class_id="38" tracking_level="0" version="0">
<first>(0P0)</first>
<second>1</second>
</item>
<item>
<first>(1P1)</first>
<second>32</second>
</item>
<item>
<first>(2P2)</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>p_Val2_2_fu_166_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>32</second>
</item>
<item>
<first>(2P2)</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>p_Val2_6_i_i_fu_174_p2 ( - ) </first>
<second>
<count>4</count>
<item_version>0</item_version>
<item>
<first>(0P0)</first>
<second>1</second>
</item>
<item>
<first>(1P1)</first>
<second>32</second>
</item>
<item>
<first>FF</first>
<second>0</second>
</item>
<item>
<first>LUT</first>
<second>39</second>
</item>
</second>
</item>
<item>
<first>sh_assign_1_fu_112_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>9</second>
</item>
<item>
<first>(2P2)</first>
<second>9</second>
</item>
<item>
<first>FF</first>
<second>0</second>
</item>
<item>
<first>LUT</first>
<second>9</second>
</item>
</second>
</item>
<item>
<first>sh_assign_fu_88_p2 ( + ) </first>
<second>
<count>4</count>
<item_version>0</item_version>
<item>
<first>(0P0)</first>
<second>8</second>
</item>
<item>
<first>(1P1)</first>
<second>9</second>
</item>
<item>
<first>FF</first>
<second>0</second>
</item>
<item>
<first>LUT</first>
<second>16</second>
</item>
</second>
</item>
<item>
<first>tmp_5_i_i_fu_102_p2 ( - ) </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>15</second>
</item>
</second>
</item>
<item>
<first>tmp_8_i_i_fu_132_p2 ( lshr ) </first>
<second>
<count>4</count>
<item_version>0</item_version>
<item>
<first>(0P0)</first>
<second>25</second>
</item>
<item>
<first>(1P1)</first>
<second>25</second>
</item>
<item>
<first>FF</first>
<second>0</second>
</item>
<item>
<first>LUT</first>
<second>73</second>
</item>
</second>
</item>
<item>
<first>tmp_i_i_fu_138_p2 ( shl ) </first>
<second>
<count>4</count>
<item_version>0</item_version>
<item>
<first>(0P0)</first>
<second>79</second>
</item>
<item>
<first>(1P1)</first>
<second>79</second>
</item>
<item>
<first>FF</first>
<second>0</second>
</item>
<item>
<first>LUT</first>
<second>243</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>0</count>
<item_version>0</item_version>
</dp_multiplexer_resource>
<dp_register_resource>
<count>2</count>
<item_version>0</item_version>
<item>
<first>p_Result_s_reg_185</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>p_Val2_2_reg_190</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_dsp_resource>
<count>0</count>
<item_version>0</item_version>
</dp_dsp_resource>
<dp_component_map class_id="39" tracking_level="0" version="0">
<count>0</count>
<item_version>0</item_version>
</dp_component_map>
<dp_expression_map>
<count>8</count>
<item_version>0</item_version>
<item class_id="40" tracking_level="0" version="0">
<first>ap_return ( select ) </first>
<second>
<count>1</count>
<item_version>0</item_version>
<item>25</item>
</second>
</item>
<item>
<first>p_Val2_2_fu_166_p3 ( select ) </first>
<second>
<count>1</count>
<item_version>0</item_version>
<item>23</item>
</second>
</item>
<item>
<first>p_Val2_6_i_i_fu_174_p2 ( - ) </first>
<second>
<count>1</count>
<item_version>0</item_version>
<item>24</item>
</second>
</item>
<item>
<first>sh_assign_1_fu_112_p3 ( select ) </first>
<second>
<count>1</count>
<item_version>0</item_version>
<item>14</item>
</second>
</item>
<item>
<first>sh_assign_fu_88_p2 ( + ) </first>
<second>
<count>1</count>
<item_version>0</item_version>
<item>10</item>
</second>
</item>
<item>
<first>tmp_5_i_i_fu_102_p2 ( - ) </first>
<second>
<count>1</count>
<item_version>0</item_version>
<item>12</item>
</second>
</item>
<item>
<first>tmp_8_i_i_fu_132_p2 ( lshr ) </first>
<second>
<count>1</count>
<item_version>0</item_version>
<item>18</item>
</second>
</item>
<item>
<first>tmp_i_i_fu_138_p2 ( shl ) </first>
<second>
<count>1</count>
<item_version>0</item_version>
<item>19</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="41" tracking_level="0" version="0">
<count>25</count>
<item_version>0</item_version>
<item class_id="42" tracking_level="0" version="0">
<first>2</first>
<second class_id="43" tracking_level="0" version="0">
<first>0</first>
<second>0</second>
</second>
</item>
<item>
<first>3</first>
<second>
<first>0</first>
<second>0</second>
</second>
</item>
<item>
<first>4</first>
<second>
<first>0</first>
<second>0</second>
</second>
</item>
<item>
<first>5</first>
<second>
<first>0</first>
<second>0</second>
</second>
</item>
<item>
<first>6</first>
<second>
<first>0</first>
<second>0</second>
</second>
</item>
<item>
<first>7</first>
<second>
<first>0</first>
<second>0</second>
</second>
</item>
<item>
<first>8</first>
<second>
<first>0</first>
<second>0</second>
</second>
</item>
<item>
<first>9</first>
<second>
<first>0</first>
<second>0</second>
</second>
</item>
<item>
<first>10</first>
<second>
<first>0</first>
<second>0</second>
</second>
</item>
<item>
<first>11</first>
<second>
<first>0</first>
<second>0</second>
</second>
</item>
<item>
<first>12</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>0</first>
<second>0</second>
</second>
</item>
<item>
<first>16</first>
<second>
<first>0</first>
<second>0</second>
</second>
</item>
<item>
<first>17</first>
<second>
<first>0</first>
<second>0</second>
</second>
</item>
<item>
<first>18</first>
<second>
<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>1</first>
<second>0</second>
</second>
</item>
<item>
<first>25</first>
<second>
<first>1</first>
<second>0</second>
</second>
</item>
<item>
<first>26</first>
<second>
<first>1</first>
<second>0</second>
</second>
</item>
</node_label_latency>
<bblk_ent_exit class_id="44" tracking_level="0" version="0">
<count>1</count>
<item_version>0</item_version>
<item class_id="45" tracking_level="0" version="0">
<first>27</first>
<second class_id="46" tracking_level="0" version="0">
<first>0</first>
<second>1</second>
</second>
</item>
</bblk_ent_exit>
<regions class_id="47" tracking_level="0" version="0">
<count>1</count>
<item_version>0</item_version>
<item class_id="48" tracking_level="1" version="0" object_id="_115">
<region_name>__hls_fptosi_float_i</region_name>
<basic_blocks>
<count>1</count>
<item_version>0</item_version>
<item>27</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>2</pipe_depth>
</item>
</regions>
<dp_fu_nodes class_id="49" tracking_level="0" version="0">
<count>24</count>
<item_version>0</item_version>
<item class_id="50" tracking_level="0" version="0">
<first>38</first>
<second>
<count>1</count>
<item_version>0</item_version>
<item>2</item>
</second>
</item>
<item>
<first>44</first>
<second>
<count>1</count>
<item_version>0</item_version>
<item>3</item>
</second>
</item>
<item>
<first>48</first>
<second>
<count>1</count>
<item_version>0</item_version>
<item>4</item>
</second>
</item>
<item>
<first>56</first>
<second>
<count>1</count>
<item_version>0</item_version>
<item>5</item>
</second>
</item>
<item>
<first>66</first>
<second>
<count>1</count>
<item_version>0</item_version>
<item>6</item>
</second>
</item>
<item>
<first>70</first>
<second>
<count>1</count>
<item_version>0</item_version>
<item>7</item>
</second>
</item>
<item>
<first>80</first>
<second>
<count>1</count>
<item_version>0</item_version>
<item>8</item>
</second>
</item>
<item>
<first>84</first>
<second>
<count>1</count>
<item_version>0</item_version>
<item>9</item>
</second>
</item>
<item>
<first>88</first>
<second>
<count>1</count>
<item_version>0</item_version>
<item>10</item>
</second>
</item>
<item>
<first>94</first>
<second>
<count>1</count>
<item_version>0</item_version>
<item>11</item>
</second>
</item>
<item>
<first>102</first>
<second>
<count>1</count>
<item_version>0</item_version>
<item>12</item>
</second>
</item>
<item>
<first>108</first>
<second>
<count>1</count>
<item_version>0</item_version>
<item>13</item>
</second>
</item>
<item>
<first>112</first>
<second>
<count>1</count>
<item_version>0</item_version>
<item>14</item>
</second>
</item>
<item>
<first>120</first>
<second>
<count>1</count>
<item_version>0</item_version>
<item>15</item>
</second>
</item>
<item>
<first>124</first>
<second>
<count>1</count>
<item_version>0</item_version>
<item>16</item>
</second>
</item>
<item>
<first>128</first>
<second>
<count>1</count>
<item_version>0</item_version>
<item>17</item>
</second>
</item>
<item>
<first>132</first>
<second>
<count>1</count>
<item_version>0</item_version>
<item>18</item>
</second>
</item>
<item>
<first>138</first>
<second>
<count>1</count>
<item_version>0</item_version>
<item>19</item>
</second>
</item>
<item>
<first>144</first>
<second>
<count>1</count>
<item_version>0</item_version>
<item>20</item>
</second>
</item>
<item>
<first>152</first>
<second>
<count>1</count>
<item_version>0</item_version>
<item>21</item>
</second>
</item>
<item>
<first>156</first>
<second>
<count>1</count>
<item_version>0</item_version>
<item>22</item>
</second>
</item>
<item>
<first>166</first>
<second>
<count>1</count>
<item_version>0</item_version>
<item>23</item>
</second>
</item>
<item>
<first>174</first>
<second>
<count>1</count>
<item_version>0</item_version>
<item>24</item>
</second>
</item>
<item>
<first>179</first>
<second>
<count>1</count>
<item_version>0</item_version>
<item>25</item>
</second>
</item>
</dp_fu_nodes>
<dp_fu_nodes_expression class_id="52" tracking_level="0" version="0">
<count>23</count>
<item_version>0</item_version>
<item class_id="53" tracking_level="0" version="0">
<first>isNeg_fu_94</first>
<second>
<count>1</count>
<item_version>0</item_version>
<item>11</item>
</second>
</item>
<item>
<first>loc_V_1_fu_66</first>
<second>
<count>1</count>
<item_version>0</item_version>
<item>6</item>
</second>
</item>
<item>
<first>loc_V_fu_56</first>
<second>
<count>1</count>
<item_version>0</item_version>
<item>5</item>
</second>
</item>
<item>
<first>p_Result_s_fu_48</first>
<second>
<count>1</count>
<item_version>0</item_version>
<item>4</item>
</second>
</item>
<item>
<first>p_Val2_2_fu_166</first>
<second>
<count>1</count>
<item_version>0</item_version>
<item>23</item>
</second>
</item>
<item>
<first>p_Val2_4_fu_179</first>
<second>
<count>1</count>
<item_version>0</item_version>
<item>25</item>
</second>
</item>
<item>
<first>p_Val2_6_i_i_fu_174</first>
<second>
<count>1</count>
<item_version>0</item_version>
<item>24</item>
</second>
</item>
<item>
<first>p_Val2_s_fu_44</first>
<second>
<count>1</count>
<item_version>0</item_version>
<item>3</item>
</second>
</item>
<item>
<first>sh_assign_1_cast_cas_fu_124</first>
<second>
<count>1</count>
<item_version>0</item_version>
<item>16</item>
</second>
</item>
<item>
<first>sh_assign_1_cast_fu_120</first>
<second>
<count>1</count>
<item_version>0</item_version>
<item>15</item>
</second>
</item>
<item>
<first>sh_assign_1_fu_112</first>
<second>
<count>1</count>
<item_version>0</item_version>
<item>14</item>
</second>
</item>
<item>
<first>sh_assign_fu_88</first>
<second>
<count>1</count>
<item_version>0</item_version>
<item>10</item>
</second>
</item>
<item>
<first>tmp_13_fu_152</first>
<second>
<count>1</count>
<item_version>0</item_version>
<item>21</item>
</second>
</item>
<item>
<first>tmp_14_fu_156</first>
<second>
<count>1</count>
<item_version>0</item_version>
<item>22</item>
</second>
</item>
<item>
<first>tmp_3_i_i_cast2_fu_80</first>
<second>
<count>1</count>
<item_version>0</item_version>
<item>8</item>
</second>
</item>
<item>
<first>tmp_3_i_i_fu_70</first>
<second>
<count>1</count>
<item_version>0</item_version>
<item>7</item>
</second>
</item>
<item>
<first>tmp_5_i_i_cast_fu_108</first>
<second>
<count>1</count>
<item_version>0</item_version>
<item>13</item>
</second>
</item>
<item>
<first>tmp_5_i_i_fu_102</first>
<second>
<count>1</count>
<item_version>0</item_version>
<item>12</item>
</second>
</item>
<item>
<first>tmp_7_i_i_fu_128</first>
<second>
<count>1</count>
<item_version>0</item_version>
<item>17</item>
</second>
</item>
<item>
<first>tmp_8_i_i_fu_132</first>
<second>
<count>1</count>
<item_version>0</item_version>
<item>18</item>
</second>
</item>
<item>
<first>tmp_fu_144</first>
<second>
<count>1</count>
<item_version>0</item_version>
<item>20</item>
</second>
</item>
<item>
<first>tmp_i_i_fu_138</first>
<second>
<count>1</count>
<item_version>0</item_version>
<item>19</item>
</second>
</item>
<item>
<first>tmp_i_i_i_cast1_fu_84</first>
<second>
<count>1</count>
<item_version>0</item_version>
<item>9</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>1</count>
<item_version>0</item_version>
<item>
<first>x_read_read_fu_38</first>
<second>
<count>1</count>
<item_version>0</item_version>
<item>2</item>
</second>
</item>
</dp_fu_nodes_io>
<return_ports>
<count>1</count>
<item_version>0</item_version>
<item>
<first>ap_return</first>
<second>
<count>1</count>
<item_version>0</item_version>
<item>26</item>
</second>
</item>
</return_ports>
<dp_mem_port_nodes class_id="54" 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>185</first>
<second>
<count>1</count>
<item_version>0</item_version>
<item>4</item>
</second>
</item>
<item>
<first>190</first>
<second>
<count>1</count>
<item_version>0</item_version>
<item>23</item>
</second>
</item>
</dp_reg_nodes>
<dp_regname_nodes>
<count>2</count>
<item_version>0</item_version>
<item>
<first>p_Result_s_reg_185</first>
<second>
<count>1</count>
<item_version>0</item_version>
<item>4</item>
</second>
</item>
<item>
<first>p_Val2_2_reg_190</first>
<second>
<count>1</count>
<item_version>0</item_version>
<item>23</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="55" tracking_level="0" version="0">
<count>1</count>
<item_version>0</item_version>
<item class_id="56" tracking_level="0" version="0">
<first>x</first>
<second>
<count>1</count>
<item_version>0</item_version>
<item>
<first>read</first>
<second>
<count>1</count>
<item_version>0</item_version>
<item>2</item>
</second>
</item>
</second>
</item>
</dp_port_io_nodes>
<port2core class_id="57" 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>
| 35.953234 | 152 | 0.470319 |
4a807caa3fa4709261987ce7e22ba15ce55ea047 | 7,238 | ads | Ada | tools-src/gnu/gcc/gcc/ada/5gsystem.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/5gsystem.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/5gsystem.ads | modern-tomato/tomato | 96f09fab4929c6ddde5c9113f1b2476ad37133c4 | [
"FSFAP"
] | 69 | 2015-01-02T10:45:56.000Z | 2021-09-06T07:52:13.000Z | ------------------------------------------------------------------------------
-- --
-- GNAT RUN-TIME COMPONENTS --
-- --
-- S Y S T E M --
-- --
-- S p e c --
-- (SGI Irix, n32 ABI) --
-- --
-- $Revision$
-- --
-- Copyright (C) 1992-2001 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 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. --
-- --
------------------------------------------------------------------------------
package System is
pragma Pure (System);
-- Note that we take advantage of the implementation permission to
-- make this unit Pure instead of Preelaborable, see RM 13.7(36)
type Name is (SYSTEM_NAME_GNAT);
System_Name : constant Name := SYSTEM_NAME_GNAT;
-- System-Dependent Named Numbers
Min_Int : constant := Long_Long_Integer'First;
Max_Int : constant := Long_Long_Integer'Last;
Max_Binary_Modulus : constant := 2 ** Long_Long_Integer'Size;
Max_Nonbinary_Modulus : constant := Integer'Last;
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 := Standard'Tick;
-- Storage-related Declarations
type Address is private;
Null_Address : constant Address;
Storage_Unit : constant := Standard'Storage_Unit;
Word_Size : constant := Standard'Word_Size;
Memory_Size : constant := 2 ** Standard'Address_Size;
-- 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 := High_Order_First;
-- Priority-related Declarations (RM D.1)
Max_Priority : constant Positive := 30;
Max_Interrupt_Priority : constant Positive := 31;
subtype Any_Priority is Integer
range 0 .. Standard'Max_Interrupt_Priority;
subtype Priority is Any_Priority
range 0 .. Standard'Max_Priority;
-- Functional notation is needed in the following to avoid visibility
-- problems when this package is compiled through rtsfind in the middle
-- of another compilation.
subtype Interrupt_Priority is Any_Priority
range
Standard."+" (Standard'Max_Priority, 1) ..
Standard'Max_Interrupt_Priority;
Default_Priority : constant Priority :=
Standard."/" (Standard."+" (Priority'First, Priority'Last), 2);
private
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.
AAMP : constant Boolean := False;
Command_Line_Args : constant Boolean := True;
Denorm : constant Boolean := False;
Frontend_Layout : constant Boolean := False;
Functions_Return_By_DSP : constant Boolean := True;
Long_Shifts_Inlined : constant Boolean := True;
High_Integrity_Mode : constant Boolean := False;
Machine_Overflows : constant Boolean := False;
Machine_Rounds : constant Boolean := True;
OpenVMS : constant Boolean := False;
Signed_Zeros : constant Boolean := True;
Stack_Check_Default : constant Boolean := False;
Stack_Check_Probes : constant Boolean := True;
Use_Ada_Main_Program_Name : constant Boolean := False;
ZCX_By_Default : constant Boolean := True;
GCC_ZCX_Support : constant Boolean := False;
Front_End_ZCX_Support : constant Boolean := True;
-- Note: Denorm is False because denormals are not supported on the
-- R10000, and we want the code to be valid for this processor.
end System;
| 47 | 78 | 0.547803 |
4aed022d801e4f8ea72e365cd6dfbf2d0f99631f | 1,575 | ads | Ada | .emacs.d/elpa/ada-mode-6.1.1/gpr_mode_wisi_parse.ads | caqg/linux-home | eed631aae6f5e59e4f46e14f1dff443abca5fa28 | [
"Linux-OpenIB"
] | null | null | null | .emacs.d/elpa/ada-mode-6.1.1/gpr_mode_wisi_parse.ads | caqg/linux-home | eed631aae6f5e59e4f46e14f1dff443abca5fa28 | [
"Linux-OpenIB"
] | null | null | null | .emacs.d/elpa/ada-mode-6.1.1/gpr_mode_wisi_parse.ads | caqg/linux-home | eed631aae6f5e59e4f46e14f1dff443abca5fa28 | [
"Linux-OpenIB"
] | null | null | null | -- Abstract :
--
-- External process parser for gpr mode
--
-- Copyright (C) 2017 - 2019 Free Software Foundation, Inc.
--
-- This program 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 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
-- distributed with this program; see file COPYING. If not, write to
-- the Free Software Foundation, 51 Franklin Street, Suite 500, Boston,
-- MA 02110-1335, USA.
pragma License (GPL);
with Gen_Emacs_Wisi_LR_Parse;
with Gpr_Process_Actions;
with Gpr_Process_LR1_Main;
with Wisi.Gpr;
procedure Gpr_Mode_Wisi_Parse is new Gen_Emacs_Wisi_LR_Parse
(Parse_Data_Type => Wisi.Gpr.Parse_Data_Type,
Language_Protocol_Version => Wisi.Gpr.Language_Protocol_Version,
Name => "gpr_mode_wisi_parse",
Descriptor => Gpr_Process_Actions.Descriptor,
Partial_Parse_Active => Gpr_Process_Actions.Partial_Parse_Active,
Language_Fixes => null,
Language_Matching_Begin_Tokens => null,
Language_String_ID_Set => null,
Create_Parser => Gpr_Process_LR1_Main.Create_Parser);
| 45 | 78 | 0.711746 |
4a49262c47a2321d86579144ef38ab497ec232d2 | 2,486 | adb | Ada | ctffttest.adb | adrianhoe/adactfft | 1a5c3236c62f7cb326da257272f4e862653b924d | [
"MIT"
] | null | null | null | ctffttest.adb | adrianhoe/adactfft | 1a5c3236c62f7cb326da257272f4e862653b924d | [
"MIT"
] | null | null | null | ctffttest.adb | adrianhoe/adactfft | 1a5c3236c62f7cb326da257272f4e862653b924d | [
"MIT"
] | null | null | null | --------------------------------------------------------------------------------
-- * Prog name ctffttest.adb
-- * Project name ctffttest
-- *
-- * Version 1.0
-- * Last update 11/5/08
-- *
-- * Created by Adrian Hoe on 11/5/08.
-- * Copyright (c) 2008 AdaStar Informatics http://adastarinformatics.com
-- * All rights reserved.
-- *
--------------------------------------------------------------------------------
with Ada.Calendar;
with Ada.Text_IO, Ada.Float_Text_IO;
with Ada.Numerics, Ada.Numerics.Generic_Elementary_Functions;
with Ada.Numerics.Float_Random;
use Ada.Calendar;
use Ada.Numerics, Ada.Numerics.FLoat_Random;
use Ada.Text_Io, Ada.Float_Text_IO;
with Ctfft, Vector;
use Ctfft, Vector;
procedure Ctffttest is
package Math is new Ada.Numerics.Generic_Elementary_Functions (Real_Number);
use Math;
Q : constant := 30.0 * 2.0 * Pi / 2 ** 8;
G : Generator;
Start_Time, End_Time : Time;
Total_Time : Duration;
Data_1 : Real_Vector_Type (1 .. 8) := (0.0, 1.0, 2.0, 3.0,
4.0, 5.0, 6.0, 7.0);
Data_2 : Real_Vector_Type (1 .. 32) := (0.0, 1.0, 2.0, 3.0,
4.0, 5.0, 6.0, 7.0,
8.0, 9.0, 10.0, 11.0,
12.0, 13.0, 14.0, 15.0,
16.0, 17.0, 18.0, 19.0,
20.0, 21.0, 22.0, 23.0,
24.0, 25.0, 26.0, 27.0,
28.0, 29.0, 30.0, 31.0);
Data_3 : Real_Vector_Type (1 .. 2 ** 4);
begin
-- Put (Data_1, 8);
-- New_Line;
Fft (Data_1);
-- Put (Data_1, 8);
New_Line;
-- Put_Line ("------------------------------------------------------------");
-- New_Line;
-- Put (Data_2, 8);
-- New_Line;
Fft (Data_2);
-- Put (Data_2, 8);
New_Line;
-- Put_Line ("------------------------------------------------------------");
New_Line;
for N in Data_3'Range loop
Data_3 (N) := Sin (Q * Real_Number (N)) + Real_Number (Random (G)) - 1.0 / 2.0;
end loop;
-- Put (Data_3, 8);
Start_Time := Clock;
Fft (Data_3);
End_Time := Clock;
Total_Time := End_Time - Start_Time;
Put ("Computation time: ");
Put (Float (Total_Time), Exp => 0, Aft => 8);
New_Line;
end Ctffttest;
| 28.906977 | 85 | 0.432019 |
c58c9000f856d3e4a6f278c7ec567652b4baa9e9 | 3,232 | adb | Ada | awa/plugins/awa-blogs/src/awa-blogs-servlets.adb | My-Colaborations/ada-awa | cc2dee291a14e4df0dbc9c10285bf284a7f1caa8 | [
"Apache-2.0"
] | 81 | 2015-01-18T23:02:30.000Z | 2022-03-19T17:34:57.000Z | awa/plugins/awa-blogs/src/awa-blogs-servlets.adb | My-Colaborations/ada-awa | cc2dee291a14e4df0dbc9c10285bf284a7f1caa8 | [
"Apache-2.0"
] | 20 | 2015-12-09T19:26:19.000Z | 2022-03-23T14:32:43.000Z | awa/plugins/awa-blogs/src/awa-blogs-servlets.adb | My-Colaborations/ada-awa | cc2dee291a14e4df0dbc9c10285bf284a7f1caa8 | [
"Apache-2.0"
] | 16 | 2015-06-29T02:44:06.000Z | 2021-09-23T18:47:50.000Z | -----------------------------------------------------------------------
-- awa-blogs-servlets -- Serve files saved in the storage service
-- Copyright (C) 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.
-----------------------------------------------------------------------
with AWA.Images.Modules;
with AWA.Blogs.Modules;
package body AWA.Blogs.Servlets is
-- ------------------------------
-- Load the data content that correspond to the GET request and get the name as well
-- as mime-type and date.
-- ------------------------------
overriding
procedure Load (Server : in Image_Servlet;
Request : in out ASF.Requests.Request'Class;
Name : out Ada.Strings.Unbounded.Unbounded_String;
Mime : out Ada.Strings.Unbounded.Unbounded_String;
Date : out Ada.Calendar.Time;
Data : out ADO.Blob_Ref) is
pragma Unreferenced (Server, Name);
Post : constant String := Request.Get_Path_Parameter (1);
File : constant String := Request.Get_Path_Parameter (2);
Size : constant String := Request.Get_Path_Parameter (3);
Module : constant AWA.Blogs.Modules.Blog_Module_Access := Blogs.Modules.Get_Blog_Module;
Post_Id : ADO.Identifier;
File_Id : ADO.Identifier;
Width : Natural;
Height : Natural;
Img_Width : Natural;
Img_Height : Natural;
begin
Post_Id := ADO.Identifier'Value (Post);
File_Id := ADO.Identifier'Value (File);
AWA.Images.Modules.Get_Sizes (Dimension => Size,
Width => Width,
Height => Height);
Img_Width := Width;
Img_Height := Height;
Module.Load_Image (Post_Id => Post_Id,
Image_Id => File_Id,
Width => Img_Width,
Height => Img_Height,
Mime => Mime,
Date => Date,
Into => Data);
end Load;
-- ------------------------------
-- Get the expected return mode (content disposition for download or inline).
-- ------------------------------
overriding
function Get_Format (Server : in Image_Servlet;
Request : in ASF.Requests.Request'Class)
return AWA.Storages.Servlets.Get_Type is
pragma Unreferenced (Server, Request);
begin
return AWA.Storages.Servlets.DEFAULT;
end Get_Format;
end AWA.Blogs.Servlets;
| 40.911392 | 97 | 0.547958 |
cb8cd1b57d8a0d229eb3a6fef1218ab1757a7eaf | 13,122 | ads | Ada | bb-runtimes/arm/stm32/stm32f401/svd/i-stm32-usart.ads | JCGobbi/Nucleo-STM32F334R8 | 2a0b1b4b2664c92773703ac5e95dcb71979d051c | [
"BSD-3-Clause"
] | null | null | null | bb-runtimes/arm/stm32/stm32f401/svd/i-stm32-usart.ads | JCGobbi/Nucleo-STM32F334R8 | 2a0b1b4b2664c92773703ac5e95dcb71979d051c | [
"BSD-3-Clause"
] | null | null | null | bb-runtimes/arm/stm32/stm32f401/svd/i-stm32-usart.ads | JCGobbi/Nucleo-STM32F334R8 | 2a0b1b4b2664c92773703ac5e95dcb71979d051c | [
"BSD-3-Clause"
] | null | null | null | --
-- Copyright (C) 2020, AdaCore
--
-- This spec has been automatically generated from STM32F401.svd
pragma Ada_2012;
pragma Style_Checks (Off);
with System;
package Interfaces.STM32.USART is
pragma Preelaborate;
pragma No_Elaboration_Code_All;
---------------
-- Registers --
---------------
subtype SR_PE_Field is Interfaces.STM32.Bit;
subtype SR_FE_Field is Interfaces.STM32.Bit;
subtype SR_NF_Field is Interfaces.STM32.Bit;
subtype SR_ORE_Field is Interfaces.STM32.Bit;
subtype SR_IDLE_Field is Interfaces.STM32.Bit;
subtype SR_RXNE_Field is Interfaces.STM32.Bit;
subtype SR_TC_Field is Interfaces.STM32.Bit;
subtype SR_TXE_Field is Interfaces.STM32.Bit;
subtype SR_LBD_Field is Interfaces.STM32.Bit;
subtype SR_CTS_Field is Interfaces.STM32.Bit;
-- Status register
type SR_Register is record
-- Read-only. Parity error
PE : SR_PE_Field := 16#0#;
-- Read-only. Framing error
FE : SR_FE_Field := 16#0#;
-- Read-only. Noise detected flag
NF : SR_NF_Field := 16#0#;
-- Read-only. Overrun error
ORE : SR_ORE_Field := 16#0#;
-- Read-only. IDLE line detected
IDLE : SR_IDLE_Field := 16#0#;
-- Read data register not empty
RXNE : SR_RXNE_Field := 16#0#;
-- Transmission complete
TC : SR_TC_Field := 16#0#;
-- Read-only. Transmit data register empty
TXE : SR_TXE_Field := 16#0#;
-- LIN break detection flag
LBD : SR_LBD_Field := 16#0#;
-- CTS flag
CTS : SR_CTS_Field := 16#0#;
-- unspecified
Reserved_10_31 : Interfaces.STM32.UInt22 := 16#3000#;
end record
with Volatile_Full_Access, Object_Size => 32,
Bit_Order => System.Low_Order_First;
for SR_Register use record
PE at 0 range 0 .. 0;
FE at 0 range 1 .. 1;
NF at 0 range 2 .. 2;
ORE at 0 range 3 .. 3;
IDLE at 0 range 4 .. 4;
RXNE at 0 range 5 .. 5;
TC at 0 range 6 .. 6;
TXE at 0 range 7 .. 7;
LBD at 0 range 8 .. 8;
CTS at 0 range 9 .. 9;
Reserved_10_31 at 0 range 10 .. 31;
end record;
subtype DR_DR_Field is Interfaces.STM32.UInt9;
-- Data register
type DR_Register is record
-- Data value
DR : DR_DR_Field := 16#0#;
-- unspecified
Reserved_9_31 : Interfaces.STM32.UInt23 := 16#0#;
end record
with Volatile_Full_Access, Object_Size => 32,
Bit_Order => System.Low_Order_First;
for DR_Register use record
DR at 0 range 0 .. 8;
Reserved_9_31 at 0 range 9 .. 31;
end record;
subtype BRR_DIV_Fraction_Field is Interfaces.STM32.UInt4;
subtype BRR_DIV_Mantissa_Field is Interfaces.STM32.UInt12;
-- Baud rate register
type BRR_Register is record
-- fraction of USARTDIV
DIV_Fraction : BRR_DIV_Fraction_Field := 16#0#;
-- mantissa of USARTDIV
DIV_Mantissa : BRR_DIV_Mantissa_Field := 16#0#;
-- unspecified
Reserved_16_31 : Interfaces.STM32.UInt16 := 16#0#;
end record
with Volatile_Full_Access, Object_Size => 32,
Bit_Order => System.Low_Order_First;
for BRR_Register use record
DIV_Fraction at 0 range 0 .. 3;
DIV_Mantissa at 0 range 4 .. 15;
Reserved_16_31 at 0 range 16 .. 31;
end record;
subtype CR1_SBK_Field is Interfaces.STM32.Bit;
subtype CR1_RWU_Field is Interfaces.STM32.Bit;
subtype CR1_RE_Field is Interfaces.STM32.Bit;
subtype CR1_TE_Field is Interfaces.STM32.Bit;
subtype CR1_IDLEIE_Field is Interfaces.STM32.Bit;
subtype CR1_RXNEIE_Field is Interfaces.STM32.Bit;
subtype CR1_TCIE_Field is Interfaces.STM32.Bit;
subtype CR1_TXEIE_Field is Interfaces.STM32.Bit;
subtype CR1_PEIE_Field is Interfaces.STM32.Bit;
subtype CR1_PS_Field is Interfaces.STM32.Bit;
subtype CR1_PCE_Field is Interfaces.STM32.Bit;
subtype CR1_WAKE_Field is Interfaces.STM32.Bit;
subtype CR1_M_Field is Interfaces.STM32.Bit;
subtype CR1_UE_Field is Interfaces.STM32.Bit;
subtype CR1_OVER8_Field is Interfaces.STM32.Bit;
-- Control register 1
type CR1_Register is record
-- Send break
SBK : CR1_SBK_Field := 16#0#;
-- Receiver wakeup
RWU : CR1_RWU_Field := 16#0#;
-- Receiver enable
RE : CR1_RE_Field := 16#0#;
-- Transmitter enable
TE : CR1_TE_Field := 16#0#;
-- IDLE interrupt enable
IDLEIE : CR1_IDLEIE_Field := 16#0#;
-- RXNE interrupt enable
RXNEIE : CR1_RXNEIE_Field := 16#0#;
-- Transmission complete interrupt enable
TCIE : CR1_TCIE_Field := 16#0#;
-- TXE interrupt enable
TXEIE : CR1_TXEIE_Field := 16#0#;
-- PE interrupt enable
PEIE : CR1_PEIE_Field := 16#0#;
-- Parity selection
PS : CR1_PS_Field := 16#0#;
-- Parity control enable
PCE : CR1_PCE_Field := 16#0#;
-- Wakeup method
WAKE : CR1_WAKE_Field := 16#0#;
-- Word length
M : CR1_M_Field := 16#0#;
-- USART enable
UE : CR1_UE_Field := 16#0#;
-- unspecified
Reserved_14_14 : Interfaces.STM32.Bit := 16#0#;
-- Oversampling mode
OVER8 : CR1_OVER8_Field := 16#0#;
-- unspecified
Reserved_16_31 : Interfaces.STM32.UInt16 := 16#0#;
end record
with Volatile_Full_Access, Object_Size => 32,
Bit_Order => System.Low_Order_First;
for CR1_Register use record
SBK at 0 range 0 .. 0;
RWU at 0 range 1 .. 1;
RE at 0 range 2 .. 2;
TE at 0 range 3 .. 3;
IDLEIE at 0 range 4 .. 4;
RXNEIE at 0 range 5 .. 5;
TCIE at 0 range 6 .. 6;
TXEIE at 0 range 7 .. 7;
PEIE at 0 range 8 .. 8;
PS at 0 range 9 .. 9;
PCE at 0 range 10 .. 10;
WAKE at 0 range 11 .. 11;
M at 0 range 12 .. 12;
UE at 0 range 13 .. 13;
Reserved_14_14 at 0 range 14 .. 14;
OVER8 at 0 range 15 .. 15;
Reserved_16_31 at 0 range 16 .. 31;
end record;
subtype CR2_ADD_Field is Interfaces.STM32.UInt4;
subtype CR2_LBDL_Field is Interfaces.STM32.Bit;
subtype CR2_LBDIE_Field is Interfaces.STM32.Bit;
subtype CR2_LBCL_Field is Interfaces.STM32.Bit;
subtype CR2_CPHA_Field is Interfaces.STM32.Bit;
subtype CR2_CPOL_Field is Interfaces.STM32.Bit;
subtype CR2_CLKEN_Field is Interfaces.STM32.Bit;
subtype CR2_STOP_Field is Interfaces.STM32.UInt2;
subtype CR2_LINEN_Field is Interfaces.STM32.Bit;
-- Control register 2
type CR2_Register is record
-- Address of the USART node
ADD : CR2_ADD_Field := 16#0#;
-- unspecified
Reserved_4_4 : Interfaces.STM32.Bit := 16#0#;
-- lin break detection length
LBDL : CR2_LBDL_Field := 16#0#;
-- LIN break detection interrupt enable
LBDIE : CR2_LBDIE_Field := 16#0#;
-- unspecified
Reserved_7_7 : Interfaces.STM32.Bit := 16#0#;
-- Last bit clock pulse
LBCL : CR2_LBCL_Field := 16#0#;
-- Clock phase
CPHA : CR2_CPHA_Field := 16#0#;
-- Clock polarity
CPOL : CR2_CPOL_Field := 16#0#;
-- Clock enable
CLKEN : CR2_CLKEN_Field := 16#0#;
-- STOP bits
STOP : CR2_STOP_Field := 16#0#;
-- LIN mode enable
LINEN : CR2_LINEN_Field := 16#0#;
-- unspecified
Reserved_15_31 : Interfaces.STM32.UInt17 := 16#0#;
end record
with Volatile_Full_Access, Object_Size => 32,
Bit_Order => System.Low_Order_First;
for CR2_Register use record
ADD at 0 range 0 .. 3;
Reserved_4_4 at 0 range 4 .. 4;
LBDL at 0 range 5 .. 5;
LBDIE at 0 range 6 .. 6;
Reserved_7_7 at 0 range 7 .. 7;
LBCL at 0 range 8 .. 8;
CPHA at 0 range 9 .. 9;
CPOL at 0 range 10 .. 10;
CLKEN at 0 range 11 .. 11;
STOP at 0 range 12 .. 13;
LINEN at 0 range 14 .. 14;
Reserved_15_31 at 0 range 15 .. 31;
end record;
subtype CR3_EIE_Field is Interfaces.STM32.Bit;
subtype CR3_IREN_Field is Interfaces.STM32.Bit;
subtype CR3_IRLP_Field is Interfaces.STM32.Bit;
subtype CR3_HDSEL_Field is Interfaces.STM32.Bit;
subtype CR3_NACK_Field is Interfaces.STM32.Bit;
subtype CR3_SCEN_Field is Interfaces.STM32.Bit;
subtype CR3_DMAR_Field is Interfaces.STM32.Bit;
subtype CR3_DMAT_Field is Interfaces.STM32.Bit;
subtype CR3_RTSE_Field is Interfaces.STM32.Bit;
subtype CR3_CTSE_Field is Interfaces.STM32.Bit;
subtype CR3_CTSIE_Field is Interfaces.STM32.Bit;
subtype CR3_ONEBIT_Field is Interfaces.STM32.Bit;
-- Control register 3
type CR3_Register is record
-- Error interrupt enable
EIE : CR3_EIE_Field := 16#0#;
-- IrDA mode enable
IREN : CR3_IREN_Field := 16#0#;
-- IrDA low-power
IRLP : CR3_IRLP_Field := 16#0#;
-- Half-duplex selection
HDSEL : CR3_HDSEL_Field := 16#0#;
-- Smartcard NACK enable
NACK : CR3_NACK_Field := 16#0#;
-- Smartcard mode enable
SCEN : CR3_SCEN_Field := 16#0#;
-- DMA enable receiver
DMAR : CR3_DMAR_Field := 16#0#;
-- DMA enable transmitter
DMAT : CR3_DMAT_Field := 16#0#;
-- RTS enable
RTSE : CR3_RTSE_Field := 16#0#;
-- CTS enable
CTSE : CR3_CTSE_Field := 16#0#;
-- CTS interrupt enable
CTSIE : CR3_CTSIE_Field := 16#0#;
-- One sample bit method enable
ONEBIT : CR3_ONEBIT_Field := 16#0#;
-- unspecified
Reserved_12_31 : Interfaces.STM32.UInt20 := 16#0#;
end record
with Volatile_Full_Access, Object_Size => 32,
Bit_Order => System.Low_Order_First;
for CR3_Register use record
EIE at 0 range 0 .. 0;
IREN at 0 range 1 .. 1;
IRLP at 0 range 2 .. 2;
HDSEL at 0 range 3 .. 3;
NACK at 0 range 4 .. 4;
SCEN at 0 range 5 .. 5;
DMAR at 0 range 6 .. 6;
DMAT at 0 range 7 .. 7;
RTSE at 0 range 8 .. 8;
CTSE at 0 range 9 .. 9;
CTSIE at 0 range 10 .. 10;
ONEBIT at 0 range 11 .. 11;
Reserved_12_31 at 0 range 12 .. 31;
end record;
subtype GTPR_PSC_Field is Interfaces.STM32.Byte;
subtype GTPR_GT_Field is Interfaces.STM32.Byte;
-- Guard time and prescaler register
type GTPR_Register is record
-- Prescaler value
PSC : GTPR_PSC_Field := 16#0#;
-- Guard time value
GT : GTPR_GT_Field := 16#0#;
-- unspecified
Reserved_16_31 : Interfaces.STM32.UInt16 := 16#0#;
end record
with Volatile_Full_Access, Object_Size => 32,
Bit_Order => System.Low_Order_First;
for GTPR_Register use record
PSC at 0 range 0 .. 7;
GT at 0 range 8 .. 15;
Reserved_16_31 at 0 range 16 .. 31;
end record;
-----------------
-- Peripherals --
-----------------
-- Universal synchronous asynchronous receiver transmitter
type USART_Peripheral is record
-- Status register
SR : aliased SR_Register;
-- Data register
DR : aliased DR_Register;
-- Baud rate register
BRR : aliased BRR_Register;
-- Control register 1
CR1 : aliased CR1_Register;
-- Control register 2
CR2 : aliased CR2_Register;
-- Control register 3
CR3 : aliased CR3_Register;
-- Guard time and prescaler register
GTPR : aliased GTPR_Register;
end record
with Volatile;
for USART_Peripheral use record
SR at 16#0# range 0 .. 31;
DR at 16#4# range 0 .. 31;
BRR at 16#8# range 0 .. 31;
CR1 at 16#C# range 0 .. 31;
CR2 at 16#10# range 0 .. 31;
CR3 at 16#14# range 0 .. 31;
GTPR at 16#18# range 0 .. 31;
end record;
-- Universal synchronous asynchronous receiver transmitter
USART1_Periph : aliased USART_Peripheral
with Import, Address => USART1_Base;
-- Universal synchronous asynchronous receiver transmitter
USART2_Periph : aliased USART_Peripheral
with Import, Address => USART2_Base;
-- Universal synchronous asynchronous receiver transmitter
USART6_Periph : aliased USART_Peripheral
with Import, Address => USART6_Base;
end Interfaces.STM32.USART;
| 35.464865 | 65 | 0.582228 |
20c74ba73d256190783f3ecaa7e482c714e23617 | 7,099 | adb | Ada | boards/MicroBit/src/microbit-time.adb | shakram02/Ada_Drivers_Library | a407ca7ddbc2d9756647016c2f8fd8ef24a239ff | [
"BSD-3-Clause"
] | 192 | 2016-06-01T18:32:04.000Z | 2022-03-26T22:52:31.000Z | boards/MicroBit/src/microbit-time.adb | shakram02/Ada_Drivers_Library | a407ca7ddbc2d9756647016c2f8fd8ef24a239ff | [
"BSD-3-Clause"
] | 239 | 2016-05-26T20:02:01.000Z | 2022-03-31T09:46:56.000Z | boards/MicroBit/src/microbit-time.adb | shakram02/Ada_Drivers_Library | a407ca7ddbc2d9756647016c2f8fd8ef24a239ff | [
"BSD-3-Clause"
] | 142 | 2016-06-05T08:12:20.000Z | 2022-03-24T17:37:17.000Z | ------------------------------------------------------------------------------
-- --
-- Copyright (C) 2016-2020, 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 nRF.Clock;
with nRF.Device; use nRF.Device;
with nRF.RTC; use nRF.RTC;
with nRF.Events;
with nRF.Interrupts;
with System.Machine_Code; use System.Machine_Code;
package body MicroBit.Time is
package Clocks renames nRF.Clock;
Clock_Ms : Time_Ms := 0 with Volatile;
Period_Ms : constant Time_Ms := 1;
Subscribers : array (1 .. 10) of Tick_Callback := (others => null);
procedure Initialize;
procedure Update_Clock;
procedure RTC1_IRQHandler;
----------------
-- Initialize --
----------------
procedure Initialize is
begin
if not Clocks.Low_Freq_Running then
Clocks.Set_Low_Freq_Source (Clocks.LFCLK_SYNTH);
Clocks.Start_Low_Freq;
loop
exit when Clocks.Low_Freq_Running;
end loop;
end if;
Stop (RTC_1);
-- 1kHz
Set_Prescaler (RTC_1, 0);
Set_Compare (RTC_1, 0, 32);
Enable_Event (RTC_1, Compare_0_Event);
nRF.Events.Enable_Interrupt (nRF.Events.RTC_1_COMPARE_0);
nRF.Interrupts.Register (nRF.Interrupts.RTC1_Interrupt,
RTC1_IRQHandler'Access);
nRF.Interrupts.Enable (nRF.Interrupts.RTC1_Interrupt);
Start (RTC_1);
end Initialize;
------------------
-- Update_Clock --
------------------
procedure Update_Clock is
begin
Clock_Ms := Clock_Ms + Period_Ms;
end Update_Clock;
---------------------
-- RTC1_IRQHandler --
---------------------
procedure RTC1_IRQHandler is
begin
Stop (RTC_1);
Clear (RTC_1);
Start (RTC_1);
nRF.Events.Clear (nRF.Events.RTC_1_COMPARE_0);
Update_Clock;
for Subs of Subscribers loop
if Subs /= null then
-- Call the subscriber
Subs.all;
end if;
end loop;
end RTC1_IRQHandler;
-----------
-- Clock --
-----------
function Clock return Time_Ms is
begin
return Clock_Ms;
end Clock;
--------------
-- Delay_Ms --
--------------
procedure Delay_Ms (Milliseconds : UInt64) is
Wakeup_Time : constant UInt64 := Clock + Milliseconds;
begin
while Wakeup_Time > Clock loop
Asm (Template => "wfi", -- Wait for interrupt
Volatile => True);
end loop;
end Delay_Ms;
-----------------
-- Tick_Period --
-----------------
function Tick_Period return Time_Ms is
begin
return Period_Ms;
end Tick_Period;
--------------------
-- Tick_Subscribe --
--------------------
function Tick_Subscriber (Callback : not null Tick_Callback) return Boolean is
begin
for Subs of Subscribers loop
if Subs = Callback then
return True;
end if;
end loop;
return False;
end Tick_Subscriber;
--------------------
-- Tick_Subscribe --
--------------------
function Tick_Subscribe (Callback : not null Tick_Callback) return Boolean is
begin
for Subs of Subscribers loop
if Subs = null then
Subs := Callback;
return True;
end if;
end loop;
return False;
end Tick_Subscribe;
----------------------
-- Tick_Unsubscribe --
----------------------
function Tick_Unsubscribe (Callback : not null Tick_Callback) return Boolean is
begin
for Subs of Subscribers loop
if Subs = Callback then
Subs := null;
return True;
end if;
end loop;
return False;
end Tick_Unsubscribe;
---------------
-- HAL_Delay --
---------------
Delay_Instance : aliased MB_Delays;
function HAL_Delay return not null HAL.Time.Any_Delays is
begin
return Delay_Instance'Access;
end HAL_Delay;
------------------------
-- Delay_Microseconds --
------------------------
overriding
procedure Delay_Microseconds (This : in out MB_Delays;
Us : Integer)
is
pragma Unreferenced (This);
begin
Delay_Ms (UInt64 (Us / 1000));
end Delay_Microseconds;
------------------------
-- Delay_Milliseconds --
------------------------
overriding
procedure Delay_Milliseconds (This : in out MB_Delays;
Ms : Integer)
is
pragma Unreferenced (This);
begin
Delay_Ms (UInt64 (Ms));
end Delay_Milliseconds;
-------------------
-- Delay_Seconds --
-------------------
overriding
procedure Delay_Seconds (This : in out MB_Delays;
S : Integer)
is
pragma Unreferenced (This);
begin
Delay_Ms (UInt64 (S * 1000));
end Delay_Seconds;
begin
Initialize;
end MicroBit.Time;
| 28.740891 | 82 | 0.527398 |
0eb28e229818ef6054cfa59e00dc23b9993f3fb6 | 6,712 | adb | Ada | arch/ARM/STM32/drivers/stm32-spi-dma.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/drivers/stm32-spi-dma.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/drivers/stm32-spi-dma.adb | shakram02/Ada_Drivers_Library | a407ca7ddbc2d9756647016c2f8fd8ef24a239ff | [
"BSD-3-Clause"
] | 142 | 2016-06-05T08:12:20.000Z | 2022-03-24T17:37:17.000Z | ------------------------------------------------------------------------------
-- --
-- Copyright (C) 2016-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 STM32.DMA; use STM32.DMA;
with HAL.SPI;
package body STM32.SPI.DMA is
procedure Transmit_Common
(This : in out SPI_Port_DMA;
Source : System.Address;
Data_Count : UInt16;
Status : out HAL.SPI.SPI_Status;
Timeout : Natural := 1000);
---------------------
-- Transmit_Common --
---------------------
procedure Transmit_Common
(This : in out SPI_Port_DMA;
Source : System.Address;
Data_Count : UInt16;
Status : out HAL.SPI.SPI_Status;
Timeout : Natural := 1000)
is
pragma Unreferenced (Timeout);
DMA_Status : DMA_Error_Code;
begin
if not Compatible_Alignments (This.TX_DMA.Controller.all,
This.TX_DMA.Stream,
Source,
This.Data_Register_Address)
then
raise Program_Error with "Incompatible alignments";
end if;
-- Enable TX DMA
This.Periph.CR2.TXDMAEN := True;
This.TX_DMA.Start_Transfer (Source => Source,
Destination => This.Data_Register_Address,
Data_Count => Data_Count);
This.TX_DMA.Wait_For_Completion (DMA_Status);
if DMA_Status = DMA_No_Error then
Status := HAL.SPI.Ok;
else
Status := HAL.SPI.Err_Error;
end if;
end Transmit_Common;
------------------------
-- Set_TX_DMA_Handler --
------------------------
procedure Set_TX_DMA_Handler
(This : in out SPI_Port_DMA;
DMA : DMA_Interrupt_Controller_Access)
is
begin
This.TX_DMA := DMA;
end Set_TX_DMA_Handler;
---------------------------
-- Set_Polling_Threshold --
---------------------------
procedure Set_Polling_Threshold
(This : in out SPI_Port_DMA;
Threshold : Natural)
is
begin
This.Threshold := Threshold;
end Set_Polling_Threshold;
---------------
-- Configure --
---------------
overriding procedure Configure
(This : in out SPI_Port_DMA;
Conf : SPI_Configuration)
is
begin
Configure (Parent (This), Conf);
end Configure;
--------------
-- Transmit --
--------------
overriding procedure Transmit
(This : in out SPI_Port_DMA;
Data : HAL.SPI.SPI_Data_8b;
Status : out HAL.SPI.SPI_Status;
Timeout : Natural := 1000)
is
begin
if This.TX_DMA = null or else Data'Length < This.Threshold then
-- Fallback to polling implementation
Transmit (Parent (This), Data, Status, Timeout);
else
Transmit_Common (This,
Data (Data'First)'Address,
Data'Length,
Status,
Timeout);
end if;
end Transmit;
--------------
-- Transmit --
--------------
overriding procedure Transmit
(This : in out SPI_Port_DMA;
Data : HAL.SPI.SPI_Data_16b;
Status : out HAL.SPI.SPI_Status;
Timeout : Natural := 1000)
is
begin
if This.TX_DMA = null or else Data'Length < This.Threshold then
-- Fallback to polling implementation
Transmit (Parent (This), Data, Status, Timeout);
else
Transmit_Common (This,
Data (Data'First)'Address,
Data'Length,
Status,
Timeout);
end if;
end Transmit;
-------------
-- Receive --
-------------
overriding procedure Receive
(This : in out SPI_Port_DMA;
Data : out HAL.SPI.SPI_Data_8b;
Status : out HAL.SPI.SPI_Status;
Timeout : Natural := 1000)
is
begin
-- Not implemented, fallback to polling implementation
Receive (Parent (This), Data, Status, Timeout);
end Receive;
-------------
-- Receive --
-------------
overriding procedure Receive
(This : in out SPI_Port_DMA;
Data : out HAL.SPI.SPI_Data_16b;
Status : out HAL.SPI.SPI_Status;
Timeout : Natural := 1000)
is
begin
-- Not implemented, fallback to polling implementation
Receive (Parent (This), Data, Status, Timeout);
end Receive;
end STM32.SPI.DMA;
| 34.244898 | 78 | 0.517729 |
c5cc731531f579f1e92bacd38682957e1ed9dc82 | 3,715 | ads | Ada | bb-runtimes/runtimes/ravenscar-full-stm32f3x4/gnat/g-shshco.ads | JCGobbi/Nucleo-STM32F334R8 | 2a0b1b4b2664c92773703ac5e95dcb71979d051c | [
"BSD-3-Clause"
] | null | null | null | bb-runtimes/runtimes/ravenscar-full-stm32f3x4/gnat/g-shshco.ads | JCGobbi/Nucleo-STM32F334R8 | 2a0b1b4b2664c92773703ac5e95dcb71979d051c | [
"BSD-3-Clause"
] | null | null | null | bb-runtimes/runtimes/ravenscar-full-stm32f3x4/gnat/g-shshco.ads | JCGobbi/Nucleo-STM32F334R8 | 2a0b1b4b2664c92773703ac5e95dcb71979d051c | [
"BSD-3-Clause"
] | null | null | null | ------------------------------------------------------------------------------
-- --
-- GNAT LIBRARY COMPONENTS --
-- --
-- G N A T . S E C U R E _ H A S H E S . S H A 2 _ C O M M O N --
-- --
-- S p e c --
-- --
-- Copyright (C) 2009-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 provides supporting code for implementation of the following
-- secure hash functions described in FIPS PUB 180-3: SHA-224, SHA-256,
-- SHA-384, SHA-512. It contains the generic transform operation that is
-- common to the above four functions. The complete text of FIPS PUB 180-3
-- can be found at:
-- http://csrc.nist.gov/publications/fips/fips180-3/fips180-3_final.pdf
-- This is an internal unit and should not be used directly in applications.
-- Use GNAT.SHA* instead.
package GNAT.Secure_Hashes.SHA2_Common is
Block_Words : constant := 16;
-- All functions operate on blocks of 16 words
generic
with package Hash_State is new Hash_Function_State (<>);
Rounds : Natural;
-- Number of transformation rounds
K : Hash_State.State;
-- Constants used in the transform operation
with function Sigma0 (X : Hash_State.Word) return Hash_State.Word is <>;
with function Sigma1 (X : Hash_State.Word) return Hash_State.Word is <>;
with function S0 (X : Hash_State.Word) return Hash_State.Word is <>;
with function S1 (X : Hash_State.Word) return Hash_State.Word is <>;
-- FIPS PUB 180-3 elementary functions
procedure Transform
(H_St : in out Hash_State.State;
M_St : in out Message_State);
end GNAT.Secure_Hashes.SHA2_Common;
| 55.447761 | 78 | 0.447914 |
4af2ee073658575cf22171466cdc3f171b09ad7e | 809 | adb | Ada | Read Only/gdb-7.12.1/gdb/testsuite/gdb.ada/rdv_wait/pck.adb | samyvic/OS-Project | 1622bc1641876584964effd91d65ef02e92728e1 | [
"Apache-2.0"
] | null | null | null | Read Only/gdb-7.12.1/gdb/testsuite/gdb.ada/rdv_wait/pck.adb | samyvic/OS-Project | 1622bc1641876584964effd91d65ef02e92728e1 | [
"Apache-2.0"
] | null | null | null | Read Only/gdb-7.12.1/gdb/testsuite/gdb.ada/rdv_wait/pck.adb | samyvic/OS-Project | 1622bc1641876584964effd91d65ef02e92728e1 | [
"Apache-2.0"
] | null | null | null | -- Copyright 2012-2017 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 Pck is
procedure Break_Me is
begin
null;
end Break_Me;
end Pck;
| 33.708333 | 73 | 0.728059 |
4a9d989da437fc38c226bf292763451e95c227a1 | 1,031 | adb | Ada | out/loop_unroll.adb | Melyodas/metalang | 399a9f1a71402c979d7f8024d4f98f081c80e771 | [
"BSD-2-Clause"
] | 22 | 2017-04-24T10:00:45.000Z | 2021-04-01T10:11:05.000Z | out/loop_unroll.adb | Melyodas/metalang | 399a9f1a71402c979d7f8024d4f98f081c80e771 | [
"BSD-2-Clause"
] | 12 | 2017-03-26T18:34:21.000Z | 2019-03-21T19:13:03.000Z | out/loop_unroll.adb | Melyodas/metalang | 399a9f1a71402c979d7f8024d4f98f081c80e771 | [
"BSD-2-Clause"
] | 7 | 2017-10-14T13:33:33.000Z | 2021-03-18T15:18:50.000Z |
with ada.text_io, ada.Integer_text_IO, Ada.Text_IO.Text_Streams, Ada.Strings.Fixed, Interfaces.C;
use ada.text_io, ada.Integer_text_IO, Ada.Strings, Ada.Strings.Fixed, Interfaces.C;
procedure loop_unroll is
type stringptr is access all char_array;
procedure PString(s : stringptr) is
begin
String'Write (Text_Streams.Stream (Current_Output), To_Ada(s.all));
end;
procedure PInt(i : in Integer) is
begin
String'Write (Text_Streams.Stream (Current_Output), Trim(Integer'Image(i), Left));
end;
--
--Ce test permet de vérifier le comportement des macros
--Il effectue du loop unrolling
--
j : Integer;
begin
j := 0;
j := 0;
PInt(j);
PString(new char_array'( To_C("" & Character'Val(10))));
j := 1;
PInt(j);
PString(new char_array'( To_C("" & Character'Val(10))));
j := 2;
PInt(j);
PString(new char_array'( To_C("" & Character'Val(10))));
j := 3;
PInt(j);
PString(new char_array'( To_C("" & Character'Val(10))));
j := 4;
PInt(j);
PString(new char_array'( To_C("" & Character'Val(10))));
end;
| 24.547619 | 97 | 0.680892 |
4a6a12be4863533a96408db8d9722fa8b88e9da0 | 2,278 | ads | Ada | source/oasis/program-elements-formal_constrained_array_types.ads | reznikmm/gela | 20134f1d154fb763812e73860c6f4b04f353df79 | [
"MIT"
] | null | null | null | source/oasis/program-elements-formal_constrained_array_types.ads | reznikmm/gela | 20134f1d154fb763812e73860c6f4b04f353df79 | [
"MIT"
] | null | null | null | source/oasis/program-elements-formal_constrained_array_types.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.Elements.Formal_Type_Definitions;
with Program.Lexical_Elements;
with Program.Elements.Discrete_Ranges;
with Program.Elements.Component_Definitions;
package Program.Elements.Formal_Constrained_Array_Types is
pragma Pure (Program.Elements.Formal_Constrained_Array_Types);
type Formal_Constrained_Array_Type is
limited interface
and Program.Elements.Formal_Type_Definitions.Formal_Type_Definition;
type Formal_Constrained_Array_Type_Access is
access all Formal_Constrained_Array_Type'Class with Storage_Size => 0;
not overriding function Index_Subtypes
(Self : Formal_Constrained_Array_Type)
return not null Program.Elements.Discrete_Ranges
.Discrete_Range_Vector_Access is abstract;
not overriding function Component_Definition
(Self : Formal_Constrained_Array_Type)
return not null Program.Elements.Component_Definitions
.Component_Definition_Access is abstract;
type Formal_Constrained_Array_Type_Text is limited interface;
type Formal_Constrained_Array_Type_Text_Access is
access all Formal_Constrained_Array_Type_Text'Class
with Storage_Size => 0;
not overriding function To_Formal_Constrained_Array_Type_Text
(Self : in out Formal_Constrained_Array_Type)
return Formal_Constrained_Array_Type_Text_Access is abstract;
not overriding function Array_Token
(Self : Formal_Constrained_Array_Type_Text)
return not null Program.Lexical_Elements.Lexical_Element_Access
is abstract;
not overriding function Left_Bracket_Token
(Self : Formal_Constrained_Array_Type_Text)
return not null Program.Lexical_Elements.Lexical_Element_Access
is abstract;
not overriding function Right_Bracket_Token
(Self : Formal_Constrained_Array_Type_Text)
return not null Program.Lexical_Elements.Lexical_Element_Access
is abstract;
not overriding function Of_Token
(Self : Formal_Constrained_Array_Type_Text)
return not null Program.Lexical_Elements.Lexical_Element_Access
is abstract;
end Program.Elements.Formal_Constrained_Array_Types;
| 36.15873 | 75 | 0.783143 |
d039e4cfbd02bff8761c78b92c632ee2a72e5c0d | 10,868 | adb | Ada | json-fast_slab_allocators.adb | annexi-strayline/ASAP-JSON | 8788f7466dfbd751fd8a3bc2d87b236f933ef858 | [
"BSD-3-Clause"
] | 1 | 2021-09-29T09:47:21.000Z | 2021-09-29T09:47:21.000Z | json-fast_slab_allocators.adb | annexi-strayline/ASAP-JSON | 8788f7466dfbd751fd8a3bc2d87b236f933ef858 | [
"BSD-3-Clause"
] | null | null | null | json-fast_slab_allocators.adb | annexi-strayline/ASAP-JSON | 8788f7466dfbd751fd8a3bc2d87b236f933ef858 | [
"BSD-3-Clause"
] | null | null | null | ------------------------------------------------------------------------------
-- --
-- JSON Parser/Constructor --
-- --
-- ------------------------------------------------------------------------ --
-- --
-- Copyright (C) 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.Unchecked_Deallocation;
with AURA.JSON;
package body JSON.Fast_Slab_Allocators is
--
-- Slab Data Structures
--
package Configuration renames AURA.JSON.Configuration;
Slab_Size : constant := Configuration.Unbounded_Codec_Slab_Size;
Slab_Alignment: constant := Configuration.Unbounded_Codec_Slab_Alignment;
subtype Slab_Offset is Storage_Offset range 1 .. Slab_Size;
type Slab_Data is array (Slab_Offset) of aliased Storage_Element with
Alignment => Slab_Alignment;
pragma Assert (Slab_Data'Size = Storage_Element'Size * Slab_Size);
-- Note that the above definition is a definite array, thus it does not need
-- to store any bounds, and Storage_Offset should be naturally aligned (and
-- thus naturally packed);
type Slab_Data_Access is access Slab_Data;
-- Slab_Size and Slab_Alignment should be such that we allocate a large
-- enough slab for the Global sized hash tables, and that we are aligned
-- on the systems pages.
--
-- As a matter of interest: this makes a 1 MiB slab with 4 KiB alignment
-- ideal for nearly all architectures that have any importance both in the
-- present, and probably for the medium-distant future.
type Slab_Descriptor;
type Slab_Handle is access Slab_Descriptor;
type Slab_Descriptor is
record
Slab : Slab_Data_Access := new Slab_Data;
Next_Free: Slab_Offset := Slab_Offset'First;
Prev_Slab: Slab_Handle := null;
-- The previously allocated full/nearly full slab in the stack. This
-- slab, and it's Prev_Slab are scanned for space on each allocation.
-- The entire stack is saved here to allow deallocation of the subpool
end record;
type Slab_Subpool is new Root_Subpool with
record
Slab_Stack: Slab_Handle := new Slab_Descriptor;
end record;
type Slab_Subpool_Handle is access all Slab_Subpool;
----------
-- Push --
----------
-- Push allocates the next slab after the existing top of the Slab_Stack
-- is exhausted
procedure Push (Subpool: in out Slab_Subpool) is
New_Slab: Slab_Handle := new Slab_Descriptor;
begin
New_Slab.Prev_Slab := Subpool.Slab_Stack;
Subpool.Slab_Stack := New_Slab;
end;
--
-- Subpool Implementation
--
--------------------
-- Create_Subpool --
--------------------
function Create_Subpool (Pool: in out Slab_Pool_Designator)
return not null Subpool_Handle
is
New_Slab_Subpool: Slab_Subpool_Handle := new Slab_Subpool;
New_Handle: Subpool_Handle := Subpool_Handle (New_Slab_Subpool);
begin
Set_Pool_Of_Subpool (Subpool => New_Handle,
To => Pool);
return New_Handle;
end Create_Subpool;
---------------------------
-- Allocate_From_Subpool --
---------------------------
procedure Allocate_From_Subpool
(Pool : in out Slab_Pool_Designator;
Storage_Address : out System.Address;
Size_In_Storage_Elements: in Storage_Count;
Alignment : in Storage_Count;
Subpool : in not null Subpool_Handle)
is
Subpool_Actual: Slab_Subpool renames Slab_Subpool(Subpool.all);
Block_Start, Block_End: Storage_Offset;
Selected_Slab : Slab_Handle;
Success: Boolean := False;
function Try_Compute_Block (Handle: not null Slab_Handle)
return Boolean
with Inline is
Slab : Slab_Data renames Handle.Slab.all;
Next_Free: Slab_Offset renames Handle.Next_Free;
Alignment_Shift: constant Storage_Offset
:= (Alignment - (Slab(Next_Free)'Address mod Alignment))
mod Alignment;
begin
Selected_Slab := Handle;
Block_Start := Next_Free + (Alignment_Shift mod Alignment);
Block_End := Block_Start + Size_In_Storage_Elements - 1;
return Block_Start in Slab_Offset and then Block_End in Slab_Offset;
end;
begin
-- We first try to check for any space in the lower two slabs
if Subpool_Actual.Slab_Stack.Prev_Slab /= null then
if Subpool_Actual.Slab_Stack.Prev_Slab.Prev_Slab /= null then
-- Try two slabs ago
Success := Try_Compute_Block
(Subpool_Actual.Slab_Stack.Prev_Slab.Prev_Slab);
end if;
if not Success then
-- Try one slab ago
Success := Try_Compute_Block (Subpool_Actual.Slab_Stack.Prev_Slab);
end if;
end if;
-- Now try the top-level block as the last ditch before allocating a new
-- slab
if not Success then
-- try current slab
Success := Try_Compute_Block (Subpool_Actual.Slab_Stack);
end if;
-- Last attempt, we allocate a new slab and then try to get a fit. If
-- that fails, the slab size is simply not large enough for the
-- allocation.
if not Success then
-- We only try this twice (one push). If a fresh slab doesn't work,
-- the slab size is too small for the allocation!
Push (Subpool_Actual);
Success := Try_Compute_Block (Subpool_Actual.Slab_Stack);
if not Success then
raise Storage_Error with
"JSON.Unbounded_Codec.Fast_Slab_Allocators: "
& "slab size is too small!";
end if;
end if;
-- We now have valid values
pragma Assert (Success);
if Block_End + 1 not in Slab_Offset then
-- Slab is totally full
pragma Assert (Block_End = Slab_Offset'Last);
Selected_Slab.Next_Free := Slab_Offset'Last;
else
Selected_Slab.Next_Free := Block_End + 1;
end if;
declare
Item: Storage_Element renames Selected_Slab.Slab.all(Block_Start);
begin
pragma Assert (Block_End - Block_Start + 1 = Size_In_Storage_Elements);
pragma Assert (Item'Address mod Alignment = 0);
Storage_Address := Item'Address;
end;
end Allocate_From_Subpool;
------------------------
-- Deallocate_Subpool --
------------------------
procedure Deallocate_Subpool (Pool : in out Slab_Pool_Designator;
Subpool: in out Subpool_Handle)
is
procedure Free_Slab is new Ada.Unchecked_Deallocation
(Object => Slab_Data, Name => Slab_Data_Access);
procedure Free_Descriptor is new Ada.Unchecked_Deallocation
(Object => Slab_Descriptor, Name => Slab_Handle);
procedure Free_Slab_Subpool is new Ada.Unchecked_Deallocation
(Object => Slab_Subpool, Name => Slab_Subpool_Handle);
Handle_Actual : Slab_Subpool_Handle := Slab_Subpool_Handle (Subpool);
Hold: Slab_Handle;
begin
if Handle_Actual = null then return; end if;
-- Pop the stack and free until we hit the end
while Handle_Actual.Slab_Stack /= null loop
Hold := Handle_Actual.Slab_Stack;
Handle_Actual.Slab_Stack := Hold.Prev_Slab;
Free_Slab (Hold.Slab);
Free_Descriptor (Hold);
end loop;
Subpool := null;
Free_Slab_Subpool (Handle_Actual);
end Deallocate_Subpool;
end JSON.Fast_Slab_Allocators;
| 40.103321 | 80 | 0.549503 |
20ea9de325b883bc32fe30d90b72f015f876a057 | 1,541 | adb | Ada | UNIT_TESTS/init_004.adb | io7m/coreland-openal-ada | dd320bf0cc42759d4b041ba660a4b3e0c7507da5 | [
"0BSD"
] | 1 | 2017-10-07T05:53:55.000Z | 2017-10-07T05:53:55.000Z | UNIT_TESTS/init_004.adb | io7m/coreland-openal-ada | dd320bf0cc42759d4b041ba660a4b3e0c7507da5 | [
"0BSD"
] | null | null | null | UNIT_TESTS/init_004.adb | io7m/coreland-openal-ada | dd320bf0cc42759d4b041ba660a4b3e0c7507da5 | [
"0BSD"
] | null | null | null | with Test;
with OpenAL.Context;
with OpenAL.Context.Error;
with OpenAL.Types;
procedure init_004 is
package ALC renames OpenAL.Context;
package ALC_Error renames OpenAL.Context.Error;
Device : ALC.Device_t;
Context : ALC.Context_t;
Attributes : ALC.Context_Attributes_t;
Current_OK : Boolean;
TC : Test.Context_t;
use type ALC.Device_t;
use type ALC.Context_t;
use type ALC_Error.Error_t;
use type OpenAL.Types.Frequency_t;
begin
Test.Initialize
(Test_Context => TC,
Program => "init_004",
Test_DB => "TEST_DB",
Test_Results => "TEST_RESULTS");
Device := ALC.Open_Default_Device;
pragma Assert (Device /= ALC.Invalid_Device);
pragma Assert (ALC_Error.Get_Error (Device) = ALC_Error.No_Error);
ALC.Set_Frequency (Attributes, 44100);
ALC.Set_Mono_Sources (Attributes, 100);
ALC.Set_Stereo_Sources (Attributes, 5);
Context := ALC.Create_Context_With_Attributes (Device, Attributes);
Test.Check (TC, 18, Context /= ALC.Invalid_Context, "Context /= ALC.Invalid_Context");
Test.Check (TC, 19, ALC_Error.Get_Error (Device) = ALC_Error.No_Error,
"ALC_Error.Get_Error (Device) = ALC_Error.No_Error");
Current_OK := ALC.Make_Context_Current (Context);
pragma Assert (Current_OK);
pragma Assert (ALC_Error.Get_Error (Device) = ALC_Error.No_Error);
ALC.Destroy_Context (Context);
pragma Assert (ALC_Error.Get_Error (Device) = ALC_Error.No_Error);
ALC.Close_Device (Device);
pragma Assert (Device = ALC.Invalid_Device);
end init_004;
| 30.215686 | 88 | 0.722258 |
202aae598fffc9bd0972b285c7e68ef0bb2febc3 | 50,334 | adb | Ada | tools-src/gnu/gcc/gcc/ada/prj-env.adb | modern-tomato/tomato | 96f09fab4929c6ddde5c9113f1b2476ad37133c4 | [
"FSFAP"
] | 80 | 2015-01-02T10:14:04.000Z | 2021-06-07T06:29:49.000Z | tools-src/gnu/gcc/gcc/ada/prj-env.adb | modern-tomato/tomato | 96f09fab4929c6ddde5c9113f1b2476ad37133c4 | [
"FSFAP"
] | 9 | 2015-05-14T11:03:12.000Z | 2018-01-04T07:12:58.000Z | tools-src/gnu/gcc/gcc/ada/prj-env.adb | modern-tomato/tomato | 96f09fab4929c6ddde5c9113f1b2476ad37133c4 | [
"FSFAP"
] | 69 | 2015-01-02T10:45:56.000Z | 2021-09-06T07:52:13.000Z | ------------------------------------------------------------------------------
-- --
-- GNAT COMPILER COMPONENTS --
-- --
-- P R J . E N V --
-- --
-- B o d y --
-- --
-- $Revision$
-- --
-- Copyright (C) 2001 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. --
-- --
-- GNAT was originally developed by the GNAT team at New York University. --
-- Extensive contributions were provided by Ada Core Technologies Inc. --
-- --
------------------------------------------------------------------------------
with GNAT.OS_Lib; use GNAT.OS_Lib;
with Namet; use Namet;
with Opt;
with Osint; use Osint;
with Output; use Output;
with Prj.Com; use Prj.Com;
with Prj.Util;
with Snames; use Snames;
with Stringt; use Stringt;
with Table;
package body Prj.Env is
type Naming_Id is new Nat;
No_Naming : constant Naming_Id := 0;
Ada_Path_Buffer : String_Access := new String (1 .. 1_000);
-- A buffer where values for ADA_INCLUDE_PATH
-- and ADA_OBJECTS_PATH are stored.
Ada_Path_Length : Natural := 0;
-- Index of the last valid character in Ada_Path_Buffer.
package Namings is new Table.Table (
Table_Component_Type => Naming_Data,
Table_Index_Type => Naming_Id,
Table_Low_Bound => 1,
Table_Initial => 5,
Table_Increment => 100,
Table_Name => "Prj.Env.Namings");
Default_Naming : constant Naming_Id := Namings.First;
Global_Configuration_Pragmas : Name_Id;
Local_Configuration_Pragmas : Name_Id;
-----------------------
-- Local Subprograms --
-----------------------
function Body_Path_Name_Of (Unit : Unit_Id) return String;
-- Returns the path name of the body of a unit.
-- Compute it first, if necessary.
function Spec_Path_Name_Of (Unit : Unit_Id) return String;
-- Returns the path name of the spec of a unit.
-- Compute it first, if necessary.
procedure Add_To_Path (Path : String);
-- Add Path to global variable Ada_Path_Buffer
-- Increment Ada_Path_Length
----------------------
-- Ada_Include_Path --
----------------------
function Ada_Include_Path (Project : Project_Id) return String_Access is
procedure Add (Project : Project_Id);
-- Add all the source directories of a project to the path,
-- only if this project has not been visited.
-- Call itself recursively for projects being modified,
-- and imported projects.
-- Add the project to the list Seen if this is the first time
-- we call Add for this project.
---------
-- Add --
---------
procedure Add (Project : Project_Id) is
begin
-- If Seen is empty, then the project cannot have been
-- visited.
if not Projects.Table (Project).Seen then
Projects.Table (Project).Seen := True;
declare
Data : Project_Data := Projects.Table (Project);
List : Project_List := Data.Imported_Projects;
Current : String_List_Id := Data.Source_Dirs;
Source_Dir : String_Element;
begin
-- Add to path all source directories of this project
while Current /= Nil_String loop
if Ada_Path_Length > 0 then
Add_To_Path (Path => (1 => Path_Separator));
end if;
Source_Dir := String_Elements.Table (Current);
String_To_Name_Buffer (Source_Dir.Value);
declare
New_Path : constant String :=
Name_Buffer (1 .. Name_Len);
begin
Add_To_Path (New_Path);
end;
Current := Source_Dir.Next;
end loop;
-- Call Add to the project being modified, if any
if Data.Modifies /= No_Project then
Add (Data.Modifies);
end if;
-- Call Add for each imported project, if any
while List /= Empty_Project_List loop
Add (Project_Lists.Table (List).Project);
List := Project_Lists.Table (List).Next;
end loop;
end;
end if;
end Add;
-- Start of processing for Ada_Include_Path
begin
-- If it is the first time we call this function for
-- this project, compute the source path
if Projects.Table (Project).Include_Path = null then
Ada_Path_Length := 0;
for Index in 1 .. Projects.Last loop
Projects.Table (Index).Seen := False;
end loop;
Add (Project);
Projects.Table (Project).Include_Path :=
new String'(Ada_Path_Buffer (1 .. Ada_Path_Length));
end if;
return Projects.Table (Project).Include_Path;
end Ada_Include_Path;
----------------------
-- Ada_Objects_Path --
----------------------
function Ada_Objects_Path
(Project : Project_Id;
Including_Libraries : Boolean := True)
return String_Access is
procedure Add (Project : Project_Id);
-- Add all the object directory of a project to the path,
-- only if this project has not been visited.
-- Call itself recursively for projects being modified,
-- and imported projects.
-- Add the project to the list Seen if this is the first time
-- we call Add for this project.
---------
-- Add --
---------
procedure Add (Project : Project_Id) is
begin
-- If this project has not been seen yet
if not Projects.Table (Project).Seen then
Projects.Table (Project).Seen := True;
declare
Data : Project_Data := Projects.Table (Project);
List : Project_List := Data.Imported_Projects;
begin
-- Add to path the object directory of this project
-- except if we don't include library project and
-- this is a library project.
if (Data.Library and then Including_Libraries)
or else
(Data.Object_Directory /= No_Name
and then
(not Including_Libraries or else not Data.Library))
then
if Ada_Path_Length > 0 then
Add_To_Path (Path => (1 => Path_Separator));
end if;
-- For a library project, att the library directory
if Data.Library then
declare
New_Path : constant String :=
Get_Name_String (Data.Library_Dir);
begin
Add_To_Path (New_Path);
end;
else
-- For a non library project, add the object directory
declare
New_Path : constant String :=
Get_Name_String (Data.Object_Directory);
begin
Add_To_Path (New_Path);
end;
end if;
end if;
-- Call Add to the project being modified, if any
if Data.Modifies /= No_Project then
Add (Data.Modifies);
end if;
-- Call Add for each imported project, if any
while List /= Empty_Project_List loop
Add (Project_Lists.Table (List).Project);
List := Project_Lists.Table (List).Next;
end loop;
end;
end if;
end Add;
-- Start of processing for Ada_Objects_Path
begin
-- If it is the first time we call this function for
-- this project, compute the objects path
if Projects.Table (Project).Objects_Path = null then
Ada_Path_Length := 0;
for Index in 1 .. Projects.Last loop
Projects.Table (Index).Seen := False;
end loop;
Add (Project);
Projects.Table (Project).Objects_Path :=
new String'(Ada_Path_Buffer (1 .. Ada_Path_Length));
end if;
return Projects.Table (Project).Objects_Path;
end Ada_Objects_Path;
-----------------
-- Add_To_Path --
-----------------
procedure Add_To_Path (Path : String) is
begin
-- If Ada_Path_Buffer is too small, double it
if Ada_Path_Length + Path'Length > Ada_Path_Buffer'Last then
declare
New_Ada_Path_Buffer : constant String_Access :=
new String
(1 .. Ada_Path_Buffer'Last +
Ada_Path_Buffer'Last);
begin
New_Ada_Path_Buffer (1 .. Ada_Path_Length) :=
Ada_Path_Buffer (1 .. Ada_Path_Length);
Ada_Path_Buffer := New_Ada_Path_Buffer;
end;
end if;
Ada_Path_Buffer
(Ada_Path_Length + 1 .. Ada_Path_Length + Path'Length) := Path;
Ada_Path_Length := Ada_Path_Length + Path'Length;
end Add_To_Path;
-----------------------
-- Body_Path_Name_Of --
-----------------------
function Body_Path_Name_Of (Unit : Unit_Id) return String is
Data : Unit_Data := Units.Table (Unit);
begin
-- If we don't know the path name of the body of this unit,
-- we compute it, and we store it.
if Data.File_Names (Body_Part).Path = No_Name then
declare
Current_Source : String_List_Id :=
Projects.Table (Data.File_Names (Body_Part).Project).Sources;
Path : GNAT.OS_Lib.String_Access;
begin
-- By default, put the file name
Data.File_Names (Body_Part).Path :=
Data.File_Names (Body_Part).Name;
-- For each source directory
while Current_Source /= Nil_String loop
String_To_Name_Buffer
(String_Elements.Table (Current_Source).Value);
Path :=
Locate_Regular_File
(Namet.Get_Name_String
(Data.File_Names (Body_Part).Name),
Name_Buffer (1 .. Name_Len));
-- If the file is in this directory,
-- then we store the path, and we are done.
if Path /= null then
Name_Len := Path'Length;
Name_Buffer (1 .. Name_Len) := Path.all;
Data.File_Names (Body_Part).Path := Name_Enter;
exit;
else
Current_Source :=
String_Elements.Table (Current_Source).Next;
end if;
end loop;
Units.Table (Unit) := Data;
end;
end if;
-- Returned the value stored
return Namet.Get_Name_String (Data.File_Names (Body_Part).Path);
end Body_Path_Name_Of;
--------------------------------
-- Create_Config_Pragmas_File --
--------------------------------
procedure Create_Config_Pragmas_File
(For_Project : Project_Id;
Main_Project : Project_Id)
is
File_Name : Temp_File_Name;
File : File_Descriptor := Invalid_FD;
The_Packages : Package_Id;
Gnatmake : Prj.Package_Id;
Compiler : Prj.Package_Id;
Current_Unit : Unit_Id := Units.First;
First_Project : Project_List := Empty_Project_List;
Current_Project : Project_List;
Current_Naming : Naming_Id;
Global_Attribute : Variable_Value := Nil_Variable_Value;
Local_Attribute : Variable_Value := Nil_Variable_Value;
Global_Attribute_Present : Boolean := False;
Local_Attribute_Present : Boolean := False;
procedure Check (Project : Project_Id);
procedure Check_Temp_File;
-- Check that a temporary file has been opened.
-- If not, create one, and put its name in the project data,
-- with the indication that it is a temporary file.
procedure Copy_File (Name : String_Id);
-- Copy a configuration pragmas file into the temp file.
procedure Put
(Unit_Name : Name_Id;
File_Name : Name_Id;
Unit_Kind : Spec_Or_Body);
-- Put an SFN pragma in the temporary file.
procedure Put (File : File_Descriptor; S : String);
procedure Put_Line (File : File_Descriptor; S : String);
-----------
-- Check --
-----------
procedure Check (Project : Project_Id) is
Data : constant Project_Data := Projects.Table (Project);
begin
if Current_Verbosity = High then
Write_Str ("Checking project file """);
Write_Str (Namet.Get_Name_String (Data.Name));
Write_Str (""".");
Write_Eol;
end if;
-- Is this project in the list of the visited project?
Current_Project := First_Project;
while Current_Project /= Empty_Project_List
and then Project_Lists.Table (Current_Project).Project /= Project
loop
Current_Project := Project_Lists.Table (Current_Project).Next;
end loop;
-- If it is not, put it in the list, and visit it
if Current_Project = Empty_Project_List then
Project_Lists.Increment_Last;
Project_Lists.Table (Project_Lists.Last) :=
(Project => Project, Next => First_Project);
First_Project := Project_Lists.Last;
-- Is the naming scheme of this project one that we know?
Current_Naming := Default_Naming;
while Current_Naming <= Namings.Last and then
not Same_Naming_Scheme
(Left => Namings.Table (Current_Naming),
Right => Data.Naming) loop
Current_Naming := Current_Naming + 1;
end loop;
-- If we don't know it, add it
if Current_Naming > Namings.Last then
Namings.Increment_Last;
Namings.Table (Namings.Last) := Data.Naming;
-- We need a temporary file to be created
Check_Temp_File;
-- Put the SFN pragmas for the naming scheme
-- Spec
Put_Line
(File, "pragma Source_File_Name");
Put_Line
(File, " (Spec_File_Name => ""*" &
Namet.Get_Name_String (Data.Naming.Current_Spec_Suffix) &
""",");
Put_Line
(File, " Casing => " &
Image (Data.Naming.Casing) & ",");
Put_Line
(File, " Dot_Replacement => """ &
Namet.Get_Name_String (Data.Naming.Dot_Replacement) &
""");");
-- and body
Put_Line
(File, "pragma Source_File_Name");
Put_Line
(File, " (Body_File_Name => ""*" &
Namet.Get_Name_String (Data.Naming.Current_Impl_Suffix) &
""",");
Put_Line
(File, " Casing => " &
Image (Data.Naming.Casing) & ",");
Put_Line
(File, " Dot_Replacement => """ &
Namet.Get_Name_String (Data.Naming.Dot_Replacement) &
""");");
-- and maybe separate
if
Data.Naming.Current_Impl_Suffix /= Data.Naming.Separate_Suffix
then
Put_Line
(File, "pragma Source_File_Name");
Put_Line
(File, " (Subunit_File_Name => ""*" &
Namet.Get_Name_String (Data.Naming.Separate_Suffix) &
""",");
Put_Line
(File, " Casing => " &
Image (Data.Naming.Casing) &
",");
Put_Line
(File, " Dot_Replacement => """ &
Namet.Get_Name_String (Data.Naming.Dot_Replacement) &
""");");
end if;
end if;
if Data.Modifies /= No_Project then
Check (Data.Modifies);
end if;
declare
Current : Project_List := Data.Imported_Projects;
begin
while Current /= Empty_Project_List loop
Check (Project_Lists.Table (Current).Project);
Current := Project_Lists.Table (Current).Next;
end loop;
end;
end if;
end Check;
---------------------
-- Check_Temp_File --
---------------------
procedure Check_Temp_File is
begin
if File = Invalid_FD then
GNAT.OS_Lib.Create_Temp_File (File, Name => File_Name);
if File = Invalid_FD then
Osint.Fail
("unable to create temporary configuration pragmas file");
elsif Opt.Verbose_Mode then
Write_Str ("Creating temp file """);
Write_Str (File_Name);
Write_Line ("""");
end if;
end if;
end Check_Temp_File;
---------------
-- Copy_File --
---------------
procedure Copy_File (Name : in String_Id) is
Input : File_Descriptor;
Buffer : String (1 .. 1_000);
Input_Length : Integer;
Output_Length : Integer;
begin
Check_Temp_File;
String_To_Name_Buffer (Name);
if Opt.Verbose_Mode then
Write_Str ("Copying config pragmas file """);
Write_Str (Name_Buffer (1 .. Name_Len));
Write_Line (""" into temp file");
end if;
declare
Name : constant String :=
Name_Buffer (1 .. Name_Len) & ASCII.NUL;
begin
Input := Open_Read (Name'Address, Binary);
end;
if Input = Invalid_FD then
Osint.Fail
("cannot open configuration pragmas file " &
Name_Buffer (1 .. Name_Len));
end if;
loop
Input_Length := Read (Input, Buffer'Address, Buffer'Length);
Output_Length := Write (File, Buffer'Address, Input_Length);
if Output_Length /= Input_Length then
Osint.Fail ("disk full");
end if;
exit when Input_Length < Buffer'Length;
end loop;
Close (Input);
end Copy_File;
---------
-- Put --
---------
procedure Put
(Unit_Name : Name_Id;
File_Name : Name_Id;
Unit_Kind : Spec_Or_Body)
is
begin
-- A temporary file needs to be open
Check_Temp_File;
-- Put the pragma SFN for the unit kind (spec or body)
Put (File, "pragma Source_File_Name (");
Put (File, Namet.Get_Name_String (Unit_Name));
if Unit_Kind = Specification then
Put (File, ", Spec_File_Name => """);
else
Put (File, ", Body_File_Name => """);
end if;
Put (File, Namet.Get_Name_String (File_Name));
Put_Line (File, """);");
end Put;
procedure Put (File : File_Descriptor; S : String) is
Last : Natural;
begin
Last := Write (File, S (S'First)'Address, S'Length);
if Last /= S'Length then
Osint.Fail ("Disk full");
end if;
if Current_Verbosity = High then
Write_Str (S);
end if;
end Put;
--------------
-- Put_Line --
--------------
procedure Put_Line (File : File_Descriptor; S : String) is
S0 : String (1 .. S'Length + 1);
Last : Natural;
begin
-- Add an ASCII.LF to the string. As this gnat.adc
-- is supposed to be used only by the compiler, we don't
-- care about the characters for the end of line.
-- The truth is we could have put a space, but it is
-- more convenient to be able to read gnat.adc during
-- development. And the development was done under UNIX.
-- Hence the ASCII.LF.
S0 (1 .. S'Length) := S;
S0 (S0'Last) := ASCII.LF;
Last := Write (File, S0'Address, S0'Length);
if Last /= S'Length + 1 then
Osint.Fail ("Disk full");
end if;
if Current_Verbosity = High then
Write_Line (S);
end if;
end Put_Line;
-- Start of processing for Create_Config_Pragmas_File
begin
if not Projects.Table (For_Project).Config_Checked then
-- Remove any memory of processed naming schemes, if any
Namings.Set_Last (Default_Naming);
-- Check the naming schemes
Check (For_Project);
-- Visit all the units and process those that need an SFN pragma
while Current_Unit <= Units.Last loop
declare
Unit : constant Unit_Data :=
Units.Table (Current_Unit);
begin
if Unit.File_Names (Specification).Needs_Pragma then
Put (Unit.Name,
Unit.File_Names (Specification).Name,
Specification);
end if;
if Unit.File_Names (Body_Part).Needs_Pragma then
Put (Unit.Name,
Unit.File_Names (Body_Part).Name,
Body_Part);
end if;
Current_Unit := Current_Unit + 1;
end;
end loop;
The_Packages := Projects.Table (Main_Project).Decl.Packages;
Gnatmake :=
Prj.Util.Value_Of
(Name => Name_Builder,
In_Packages => The_Packages);
if Gnatmake /= No_Package then
Global_Attribute := Prj.Util.Value_Of
(Variable_Name => Global_Configuration_Pragmas,
In_Variables => Packages.Table (Gnatmake).Decl.Attributes);
Global_Attribute_Present :=
Global_Attribute /= Nil_Variable_Value
and then String_Length (Global_Attribute.Value) > 0;
end if;
The_Packages := Projects.Table (For_Project).Decl.Packages;
Compiler :=
Prj.Util.Value_Of
(Name => Name_Compiler,
In_Packages => The_Packages);
if Compiler /= No_Package then
Local_Attribute := Prj.Util.Value_Of
(Variable_Name => Local_Configuration_Pragmas,
In_Variables => Packages.Table (Compiler).Decl.Attributes);
Local_Attribute_Present :=
Local_Attribute /= Nil_Variable_Value
and then String_Length (Local_Attribute.Value) > 0;
end if;
if Global_Attribute_Present then
if File /= Invalid_FD
or else Local_Attribute_Present
then
Copy_File (Global_Attribute.Value);
else
String_To_Name_Buffer (Global_Attribute.Value);
Projects.Table (For_Project).Config_File_Name := Name_Find;
end if;
end if;
if Local_Attribute_Present then
if File /= Invalid_FD then
Copy_File (Local_Attribute.Value);
else
String_To_Name_Buffer (Local_Attribute.Value);
Projects.Table (For_Project).Config_File_Name := Name_Find;
end if;
end if;
if File /= Invalid_FD then
GNAT.OS_Lib.Close (File);
if Opt.Verbose_Mode then
Write_Str ("Closing configuration file """);
Write_Str (File_Name);
Write_Line ("""");
end if;
Name_Len := File_Name'Length;
Name_Buffer (1 .. Name_Len) := File_Name;
Projects.Table (For_Project).Config_File_Name := Name_Find;
Projects.Table (For_Project).Config_File_Temp := True;
end if;
Projects.Table (For_Project).Config_Checked := True;
end if;
end Create_Config_Pragmas_File;
-------------------------
-- Create_Mapping_File --
-------------------------
procedure Create_Mapping_File (Name : in out Temp_File_Name) is
File : File_Descriptor := Invalid_FD;
The_Unit_Data : Unit_Data;
Data : File_Name_Data;
procedure Put (S : String);
-- Put a line in the mapping file
procedure Put_Data (Spec : Boolean);
-- Put the mapping of the spec or body contained in Data in the file
-- (3 lines).
---------
-- Put --
---------
procedure Put (S : String) is
Last : Natural;
begin
Last := Write (File, S'Address, S'Length);
if Last /= S'Length then
Osint.Fail ("Disk full");
end if;
end Put;
--------------
-- Put_Data --
--------------
procedure Put_Data (Spec : Boolean) is
begin
Put (Get_Name_String (The_Unit_Data.Name));
if Spec then
Put ("%s");
else
Put ("%b");
end if;
Put (S => (1 => ASCII.LF));
Put (Get_Name_String (Data.Name));
Put (S => (1 => ASCII.LF));
Put (Get_Name_String (Data.Path));
Put (S => (1 => ASCII.LF));
end Put_Data;
-- Start of processing for Create_Mapping_File
begin
GNAT.OS_Lib.Create_Temp_File (File, Name => Name);
if File = Invalid_FD then
Osint.Fail
("unable to create temporary mapping file");
elsif Opt.Verbose_Mode then
Write_Str ("Creating temp mapping file """);
Write_Str (Name);
Write_Line ("""");
end if;
-- For all units in table Units
for Unit in 1 .. Units.Last loop
The_Unit_Data := Units.Table (Unit);
-- If the unit has a valid name
if The_Unit_Data.Name /= No_Name then
Data := The_Unit_Data.File_Names (Specification);
-- If there is a spec, put it mapping in the file
if Data.Name /= No_Name then
Put_Data (Spec => True);
end if;
Data := The_Unit_Data.File_Names (Body_Part);
-- If there is a body (or subunit) put its mapping in the file
if Data.Name /= No_Name then
Put_Data (Spec => False);
end if;
end if;
end loop;
GNAT.OS_Lib.Close (File);
end Create_Mapping_File;
------------------------------------
-- File_Name_Of_Library_Unit_Body --
------------------------------------
function File_Name_Of_Library_Unit_Body
(Name : String;
Project : Project_Id)
return String
is
Data : constant Project_Data := Projects.Table (Project);
Original_Name : String := Name;
Extended_Spec_Name : String :=
Name & Namet.Get_Name_String
(Data.Naming.Current_Spec_Suffix);
Extended_Body_Name : String :=
Name & Namet.Get_Name_String
(Data.Naming.Current_Impl_Suffix);
Unit : Unit_Data;
The_Original_Name : Name_Id;
The_Spec_Name : Name_Id;
The_Body_Name : Name_Id;
begin
Canonical_Case_File_Name (Original_Name);
Name_Len := Original_Name'Length;
Name_Buffer (1 .. Name_Len) := Original_Name;
The_Original_Name := Name_Find;
Canonical_Case_File_Name (Extended_Spec_Name);
Name_Len := Extended_Spec_Name'Length;
Name_Buffer (1 .. Name_Len) := Extended_Spec_Name;
The_Spec_Name := Name_Find;
Canonical_Case_File_Name (Extended_Body_Name);
Name_Len := Extended_Body_Name'Length;
Name_Buffer (1 .. Name_Len) := Extended_Body_Name;
The_Body_Name := Name_Find;
if Current_Verbosity = High then
Write_Str ("Looking for file name of """);
Write_Str (Name);
Write_Char ('"');
Write_Eol;
Write_Str (" Extended Spec Name = """);
Write_Str (Extended_Spec_Name);
Write_Char ('"');
Write_Eol;
Write_Str (" Extended Body Name = """);
Write_Str (Extended_Body_Name);
Write_Char ('"');
Write_Eol;
end if;
-- For every unit
for Current in reverse Units.First .. Units.Last loop
Unit := Units.Table (Current);
-- Case of unit of the same project
if Unit.File_Names (Body_Part).Project = Project then
declare
Current_Name : constant Name_Id :=
Unit.File_Names (Body_Part).Name;
begin
-- Case of a body present
if Current_Name /= No_Name then
if Current_Verbosity = High then
Write_Str (" Comparing with """);
Write_Str (Get_Name_String (Current_Name));
Write_Char ('"');
Write_Eol;
end if;
-- If it has the name of the original name,
-- return the original name
if Unit.Name = The_Original_Name
or else Current_Name = The_Original_Name
then
if Current_Verbosity = High then
Write_Line (" OK");
end if;
return Get_Name_String (Current_Name);
-- If it has the name of the extended body name,
-- return the extended body name
elsif Current_Name = The_Body_Name then
if Current_Verbosity = High then
Write_Line (" OK");
end if;
return Extended_Body_Name;
else
if Current_Verbosity = High then
Write_Line (" not good");
end if;
end if;
end if;
end;
end if;
-- Case of a unit of the same project
if Units.Table (Current).File_Names (Specification).Project =
Project
then
declare
Current_Name : constant Name_Id :=
Unit.File_Names (Specification).Name;
begin
-- Case of spec present
if Current_Name /= No_Name then
if Current_Verbosity = High then
Write_Str (" Comparing with """);
Write_Str (Get_Name_String (Current_Name));
Write_Char ('"');
Write_Eol;
end if;
-- If name same as the original name, return original name
if Unit.Name = The_Original_Name
or else Current_Name = The_Original_Name
then
if Current_Verbosity = High then
Write_Line (" OK");
end if;
return Get_Name_String (Current_Name);
-- If it has the same name as the extended spec name,
-- return the extended spec name.
elsif Current_Name = The_Spec_Name then
if Current_Verbosity = High then
Write_Line (" OK");
end if;
return Extended_Spec_Name;
else
if Current_Verbosity = High then
Write_Line (" not good");
end if;
end if;
end if;
end;
end if;
end loop;
-- We don't know this file name, return an empty string
return "";
end File_Name_Of_Library_Unit_Body;
-------------------------
-- For_All_Object_Dirs --
-------------------------
procedure For_All_Object_Dirs (Project : Project_Id) is
Seen : Project_List := Empty_Project_List;
procedure Add (Project : Project_Id);
-- Process a project. Remember the processes visited to avoid
-- processing a project twice. Recursively process an eventual
-- modified project, and all imported projects.
---------
-- Add --
---------
procedure Add (Project : Project_Id) is
Data : constant Project_Data := Projects.Table (Project);
List : Project_List := Data.Imported_Projects;
begin
-- If the list of visited project is empty, then
-- for sure we never visited this project.
if Seen = Empty_Project_List then
Project_Lists.Increment_Last;
Seen := Project_Lists.Last;
Project_Lists.Table (Seen) :=
(Project => Project, Next => Empty_Project_List);
else
-- Check if the project is in the list
declare
Current : Project_List := Seen;
begin
loop
-- If it is, then there is nothing else to do
if Project_Lists.Table (Current).Project = Project then
return;
end if;
exit when Project_Lists.Table (Current).Next =
Empty_Project_List;
Current := Project_Lists.Table (Current).Next;
end loop;
-- This project has never been visited, add it
-- to the list.
Project_Lists.Increment_Last;
Project_Lists.Table (Current).Next := Project_Lists.Last;
Project_Lists.Table (Project_Lists.Last) :=
(Project => Project, Next => Empty_Project_List);
end;
end if;
-- If there is an object directory, call Action
-- with its name
if Data.Object_Directory /= No_Name then
Get_Name_String (Data.Object_Directory);
Action (Name_Buffer (1 .. Name_Len));
end if;
-- If we are extending a project, visit it
if Data.Modifies /= No_Project then
Add (Data.Modifies);
end if;
-- And visit all imported projects
while List /= Empty_Project_List loop
Add (Project_Lists.Table (List).Project);
List := Project_Lists.Table (List).Next;
end loop;
end Add;
-- Start of processing for For_All_Object_Dirs
begin
-- Visit this project, and its imported projects,
-- recursively
Add (Project);
end For_All_Object_Dirs;
-------------------------
-- For_All_Source_Dirs --
-------------------------
procedure For_All_Source_Dirs (Project : Project_Id) is
Seen : Project_List := Empty_Project_List;
procedure Add (Project : Project_Id);
-- Process a project. Remember the processes visited to avoid
-- processing a project twice. Recursively process an eventual
-- modified project, and all imported projects.
---------
-- Add --
---------
procedure Add (Project : Project_Id) is
Data : constant Project_Data := Projects.Table (Project);
List : Project_List := Data.Imported_Projects;
begin
-- If the list of visited project is empty, then
-- for sure we never visited this project.
if Seen = Empty_Project_List then
Project_Lists.Increment_Last;
Seen := Project_Lists.Last;
Project_Lists.Table (Seen) :=
(Project => Project, Next => Empty_Project_List);
else
-- Check if the project is in the list
declare
Current : Project_List := Seen;
begin
loop
-- If it is, then there is nothing else to do
if Project_Lists.Table (Current).Project = Project then
return;
end if;
exit when Project_Lists.Table (Current).Next =
Empty_Project_List;
Current := Project_Lists.Table (Current).Next;
end loop;
-- This project has never been visited, add it
-- to the list.
Project_Lists.Increment_Last;
Project_Lists.Table (Current).Next := Project_Lists.Last;
Project_Lists.Table (Project_Lists.Last) :=
(Project => Project, Next => Empty_Project_List);
end;
end if;
declare
Current : String_List_Id := Data.Source_Dirs;
The_String : String_Element;
begin
-- Call action with the name of every source directorie
while Current /= Nil_String loop
The_String := String_Elements.Table (Current);
String_To_Name_Buffer (The_String.Value);
Action (Name_Buffer (1 .. Name_Len));
Current := The_String.Next;
end loop;
end;
-- If we are extending a project, visit it
if Data.Modifies /= No_Project then
Add (Data.Modifies);
end if;
-- And visit all imported projects
while List /= Empty_Project_List loop
Add (Project_Lists.Table (List).Project);
List := Project_Lists.Table (List).Next;
end loop;
end Add;
-- Start of processing for For_All_Source_Dirs
begin
-- Visit this project, and its imported projects recursively
Add (Project);
end For_All_Source_Dirs;
-------------------
-- Get_Reference --
-------------------
procedure Get_Reference
(Source_File_Name : String;
Project : out Project_Id;
Path : out Name_Id)
is
begin
if Current_Verbosity > Default then
Write_Str ("Getting Reference_Of (""");
Write_Str (Source_File_Name);
Write_Str (""") ... ");
end if;
declare
Original_Name : String := Source_File_Name;
Unit : Unit_Data;
begin
Canonical_Case_File_Name (Original_Name);
for Id in Units.First .. Units.Last loop
Unit := Units.Table (Id);
if (Unit.File_Names (Specification).Name /= No_Name
and then
Namet.Get_Name_String
(Unit.File_Names (Specification).Name) = Original_Name)
or else (Unit.File_Names (Specification).Path /= No_Name
and then
Namet.Get_Name_String
(Unit.File_Names (Specification).Path) =
Original_Name)
then
Project := Unit.File_Names (Specification).Project;
Path := Unit.File_Names (Specification).Path;
if Current_Verbosity > Default then
Write_Str ("Done: Specification.");
Write_Eol;
end if;
return;
elsif (Unit.File_Names (Body_Part).Name /= No_Name
and then
Namet.Get_Name_String
(Unit.File_Names (Body_Part).Name) = Original_Name)
or else (Unit.File_Names (Body_Part).Path /= No_Name
and then Namet.Get_Name_String
(Unit.File_Names (Body_Part).Path) =
Original_Name)
then
Project := Unit.File_Names (Body_Part).Project;
Path := Unit.File_Names (Body_Part).Path;
if Current_Verbosity > Default then
Write_Str ("Done: Body.");
Write_Eol;
end if;
return;
end if;
end loop;
end;
Project := No_Project;
Path := No_Name;
if Current_Verbosity > Default then
Write_Str ("Cannot be found.");
Write_Eol;
end if;
end Get_Reference;
----------------
-- Initialize --
----------------
procedure Initialize is
Global : constant String := "global_configuration_pragmas";
Local : constant String := "local_configuration_pragmas";
begin
-- Put the standard GNAT naming scheme in the Namings table
Namings.Increment_Last;
Namings.Table (Namings.Last) := Standard_Naming_Data;
Name_Len := Global'Length;
Name_Buffer (1 .. Name_Len) := Global;
Global_Configuration_Pragmas := Name_Find;
Name_Len := Local'Length;
Name_Buffer (1 .. Name_Len) := Local;
Local_Configuration_Pragmas := Name_Find;
end Initialize;
------------------------------------
-- Path_Name_Of_Library_Unit_Body --
------------------------------------
function Path_Name_Of_Library_Unit_Body
(Name : String;
Project : Project_Id)
return String
is
Data : constant Project_Data := Projects.Table (Project);
Original_Name : String := Name;
Extended_Spec_Name : String :=
Name & Namet.Get_Name_String
(Data.Naming.Current_Spec_Suffix);
Extended_Body_Name : String :=
Name & Namet.Get_Name_String
(Data.Naming.Current_Impl_Suffix);
First : Unit_Id := Units.First;
Current : Unit_Id;
Unit : Unit_Data;
begin
Canonical_Case_File_Name (Original_Name);
Canonical_Case_File_Name (Extended_Spec_Name);
Canonical_Case_File_Name (Extended_Spec_Name);
if Current_Verbosity = High then
Write_Str ("Looking for path name of """);
Write_Str (Name);
Write_Char ('"');
Write_Eol;
Write_Str (" Extended Spec Name = """);
Write_Str (Extended_Spec_Name);
Write_Char ('"');
Write_Eol;
Write_Str (" Extended Body Name = """);
Write_Str (Extended_Body_Name);
Write_Char ('"');
Write_Eol;
end if;
while First <= Units.Last
and then Units.Table (First).File_Names (Body_Part).Project /= Project
loop
First := First + 1;
end loop;
Current := First;
while Current <= Units.Last loop
Unit := Units.Table (Current);
if Unit.File_Names (Body_Part).Project = Project
and then Unit.File_Names (Body_Part).Name /= No_Name
then
declare
Current_Name : constant String :=
Namet.Get_Name_String (Unit.File_Names (Body_Part).Name);
begin
if Current_Verbosity = High then
Write_Str (" Comparing with """);
Write_Str (Current_Name);
Write_Char ('"');
Write_Eol;
end if;
if Current_Name = Original_Name then
if Current_Verbosity = High then
Write_Line (" OK");
end if;
return Body_Path_Name_Of (Current);
elsif Current_Name = Extended_Body_Name then
if Current_Verbosity = High then
Write_Line (" OK");
end if;
return Body_Path_Name_Of (Current);
else
if Current_Verbosity = High then
Write_Line (" not good");
end if;
end if;
end;
elsif Unit.File_Names (Specification).Name /= No_Name then
declare
Current_Name : constant String :=
Namet.Get_Name_String
(Unit.File_Names (Specification).Name);
begin
if Current_Verbosity = High then
Write_Str (" Comparing with """);
Write_Str (Current_Name);
Write_Char ('"');
Write_Eol;
end if;
if Current_Name = Original_Name then
if Current_Verbosity = High then
Write_Line (" OK");
end if;
return Spec_Path_Name_Of (Current);
elsif Current_Name = Extended_Spec_Name then
if Current_Verbosity = High then
Write_Line (" OK");
end if;
return Spec_Path_Name_Of (Current);
else
if Current_Verbosity = High then
Write_Line (" not good");
end if;
end if;
end;
end if;
Current := Current + 1;
end loop;
return "";
end Path_Name_Of_Library_Unit_Body;
-------------------
-- Print_Sources --
-------------------
procedure Print_Sources is
Unit : Unit_Data;
begin
Write_Line ("List of Sources:");
for Id in Units.First .. Units.Last loop
Unit := Units.Table (Id);
Write_Str (" ");
Write_Line (Namet.Get_Name_String (Unit.Name));
if Unit.File_Names (Specification).Name /= No_Name then
if Unit.File_Names (Specification).Project = No_Project then
Write_Line (" No project");
else
Write_Str (" Project: ");
Get_Name_String
(Projects.Table
(Unit.File_Names (Specification).Project).Path_Name);
Write_Line (Name_Buffer (1 .. Name_Len));
end if;
Write_Str (" spec: ");
Write_Line
(Namet.Get_Name_String
(Unit.File_Names (Specification).Name));
end if;
if Unit.File_Names (Body_Part).Name /= No_Name then
if Unit.File_Names (Body_Part).Project = No_Project then
Write_Line (" No project");
else
Write_Str (" Project: ");
Get_Name_String
(Projects.Table
(Unit.File_Names (Body_Part).Project).Path_Name);
Write_Line (Name_Buffer (1 .. Name_Len));
end if;
Write_Str (" body: ");
Write_Line
(Namet.Get_Name_String
(Unit.File_Names (Body_Part).Name));
end if;
end loop;
Write_Line ("end of List of Sources.");
end Print_Sources;
-----------------------
-- Spec_Path_Name_Of --
-----------------------
function Spec_Path_Name_Of (Unit : Unit_Id) return String is
Data : Unit_Data := Units.Table (Unit);
begin
if Data.File_Names (Specification).Path = No_Name then
declare
Current_Source : String_List_Id :=
Projects.Table (Data.File_Names (Specification).Project).Sources;
Path : GNAT.OS_Lib.String_Access;
begin
Data.File_Names (Specification).Path :=
Data.File_Names (Specification).Name;
while Current_Source /= Nil_String loop
String_To_Name_Buffer
(String_Elements.Table (Current_Source).Value);
Path := Locate_Regular_File
(Namet.Get_Name_String
(Data.File_Names (Specification).Name),
Name_Buffer (1 .. Name_Len));
if Path /= null then
Name_Len := Path'Length;
Name_Buffer (1 .. Name_Len) := Path.all;
Data.File_Names (Specification).Path := Name_Enter;
exit;
else
Current_Source :=
String_Elements.Table (Current_Source).Next;
end if;
end loop;
Units.Table (Unit) := Data;
end;
end if;
return Namet.Get_Name_String (Data.File_Names (Specification).Path);
end Spec_Path_Name_Of;
end Prj.Env;
| 32.039465 | 79 | 0.509695 |
dcc241568e5cf0f57974fb2cc9965acc7cd2c110 | 1,464 | adb | Ada | src/sparknacl-debug.adb | rod-chapman/SPARKNaCl | afe46fde2fe5ea78aa53d380e2b7f64ae725ec0e | [
"BSD-3-Clause"
] | 76 | 2020-02-24T20:30:15.000Z | 2022-02-16T15:10:56.000Z | src/sparknacl-debug.adb | rod-chapman/SPARKNaCl | afe46fde2fe5ea78aa53d380e2b7f64ae725ec0e | [
"BSD-3-Clause"
] | 10 | 2020-04-15T10:02:49.000Z | 2022-02-24T20:10:46.000Z | src/sparknacl-debug.adb | rod-chapman/SPARKNaCl | afe46fde2fe5ea78aa53d380e2b7f64ae725ec0e | [
"BSD-3-Clause"
] | 4 | 2020-03-10T15:19:45.000Z | 2022-02-17T09:46:20.000Z | with Ada.Text_IO; use Ada.Text_IO;
package body SPARKNaCl.Debug
with SPARK_Mode => Off
is
On : constant Boolean := True;
package I64IO is new Ada.Text_IO.Integer_IO (Integer_64);
type BToCT is array (Byte range 0 .. 15) of Character;
BToC : constant BToCT :=
('0', '1', '2', '3', '4', '5', '6', '7', '8', '9',
'A', 'B', 'C', 'D', 'E', 'F');
procedure PB (X : in Byte);
procedure PB (X : in Byte)
is
begin
if On then
Put ("16#");
Put (BToC (X / 16));
Put (BToC (X mod 16));
Put ("# ");
end if;
end PB;
procedure DH (S : in String; D : in Byte_Seq)
is
begin
if On then
Put_Line (S);
for I in D'Range loop
PB (D (I));
if I mod 8 = 7 then
New_Line;
end if;
end loop;
New_Line;
end if;
end DH;
procedure DH (S : in String; D : in I64)
is
begin
if On then
Put (S & ' ');
I64IO.Put (D, Width => 0);
New_Line;
end if;
end DH;
procedure DH (S : in String; D : in Boolean)
is
begin
if On then
Put_Line (S);
Put (Img (D));
New_Line;
end if;
end DH;
procedure DHH (S : in String; D : in I64)
is
begin
if On then
Put_Line (S);
I64IO.Put (D, Width => 0, Base => 16);
New_Line;
end if;
end DHH;
end SPARKNaCl.Debug;
| 20.054795 | 60 | 0.473361 |
18f80c3c061a432357106f0a26595b55212058cd | 6,249 | ada | Ada | gcc-gcc-7_3_0-release/gcc/testsuite/ada/acats/tests/c8/c83023a.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/c8/c83023a.ada | best08618/asylo | 5a520a9f5c461ede0f32acc284017b737a43898c | [
"Apache-2.0"
] | null | null | null | gcc-gcc-7_3_0-release/gcc/testsuite/ada/acats/tests/c8/c83023a.ada | best08618/asylo | 5a520a9f5c461ede0f32acc284017b737a43898c | [
"Apache-2.0"
] | 2 | 2020-07-27T00:22:36.000Z | 2021-04-01T09:41:02.000Z | -- C83023A.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 DECLARATION IN A DECLARATIVE REGION OF A TASK
-- HIDES AN OUTER DECLARATION OF A HOMOGRAPH. ALSO CHECK THAT THE
-- OUTER DECLARATION IS DIRECTLY VISIBLE IN BOTH DECLARATIVE
-- REGIONS BEFORE THE DECLARATION OF THE INNER HOMOGRAPH AND THE
-- OUTER DECLARATION IS VISIBLE BY SELECTION AFTER THE INNER
-- HOMOGRAPH DECLARATION.
-- HISTORY:
-- BCB 08/29/88 CREATED ORIGINAL TEST.
WITH REPORT; USE REPORT;
PROCEDURE C83023A IS
GENERIC
TYPE T IS PRIVATE;
X : T;
FUNCTION GEN_FUN RETURN T;
FUNCTION GEN_FUN RETURN T IS
BEGIN
RETURN X;
END GEN_FUN;
BEGIN
TEST ("C83023A", "CHECK THAT A DECLARATION IN A DECLARATIVE " &
"REGION OF A TASK HIDES AN OUTER " &
"DECLARATION OF A HOMOGRAPH");
ONE:
DECLARE -- DECLARATIVE REGION.
A : INTEGER := IDENT_INT(2);
B : INTEGER := A;
TASK INNER IS
ENTRY HERE (X : IN OUT INTEGER);
END INNER;
TASK BODY INNER IS
C : INTEGER := A;
A : INTEGER := IDENT_INT(3);
BEGIN
ACCEPT HERE (X : IN OUT INTEGER) DO
IF A /= IDENT_INT(3) THEN
FAILED ("INCORRECT VALUE FOR INNER HOMOGRAPH" &
" - 1");
END IF;
IF ONE.A /= IDENT_INT(2) THEN
FAILED ("INCORRECT VALUE FOR OUTER HOMOGRAPH" &
" - 2");
END IF;
IF ONE.B /= IDENT_INT(2) THEN
FAILED ("INCORRECT VALUE FOR OUTER VARIABLE " &
"- 3");
END IF;
IF C /= IDENT_INT(2) THEN
FAILED ("INCORRECT VALUE FOR INNER VARIABLE " &
"- 4");
END IF;
IF X /= IDENT_INT(2) THEN
FAILED ("INCORRECT VALUE PASSED IN - 5");
END IF;
IF EQUAL(1,1) THEN
X := A;
ELSE
X := ONE.A;
END IF;
END HERE;
END INNER;
BEGIN -- ONE
INNER.HERE(A);
IF A /= IDENT_INT(3) THEN
FAILED ("INCORRECT VALUE PASSED OUT - 6");
END IF;
END ONE;
TWO:
DECLARE -- AFTER THE SPECIFICATION OF TASK.
TASK INNER IS
ENTRY HERE (X : IN OUT INTEGER);
END INNER;
A : INTEGER := IDENT_INT(2);
B : INTEGER := A;
TASK BODY INNER IS
C : INTEGER := A;
A : INTEGER := IDENT_INT(3);
BEGIN
ACCEPT HERE (X : IN OUT INTEGER) DO
IF A /= IDENT_INT(3) THEN
FAILED ("INCORRECT VALUE FOR INNER HOMOGRAPH" &
" - 10");
END IF;
IF TWO.A /= IDENT_INT(2) THEN
FAILED ("INCORRECT VALUE FOR OUTER HOMOGRAPH" &
" - 11");
END IF;
IF TWO.B /= IDENT_INT(2) THEN
FAILED ("INCORRECT VALUE FOR OUTER VARIABLE " &
"- 12");
END IF;
IF C /= IDENT_INT(2) THEN
FAILED ("INCORRECT VALUE FOR INNER VARIABLE " &
"- 13");
END IF;
IF X /= IDENT_INT(2) THEN
FAILED ("INCORRECT VALUE PASSED IN - 14");
END IF;
IF EQUAL(1,1) THEN
X := A;
ELSE
NULL;
END IF;
END HERE;
END INNER;
BEGIN -- TWO
INNER.HERE(A);
IF A /= IDENT_INT(3) THEN
FAILED ("INCORRECT VALUE PASSED OUT - 15");
END IF;
END TWO;
THREE:
DECLARE -- OVERLOADING OF FUNCTIONS.
OBJ : INTEGER := 1;
FLO : FLOAT := 5.0;
FUNCTION F IS NEW GEN_FUN (INTEGER, OBJ);
TASK INNER IS
ENTRY HERE (X : IN OUT INTEGER);
END INNER;
FUNCTION F IS NEW GEN_FUN (FLOAT, FLO);
TASK BODY INNER IS
F : FLOAT := 6.25;
BEGIN
ACCEPT HERE (X : IN OUT INTEGER) DO
X := INTEGER(F);
END HERE;
END INNER;
BEGIN
INNER.HERE (OBJ);
IF OBJ /= IDENT_INT(6) THEN
FAILED ("INCORRECT VALUE RETURNED FROM FUNCTION - 20");
END IF;
END THREE;
RESULT;
END C83023A;
| 32.046154 | 79 | 0.466315 |
0e987ea0bab7f58df56c85a958e3bd13c89deffb | 2,988 | ads | Ada | gcc-gcc-7_3_0-release/gcc/ada/s-solita.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-solita.ads | best08618/asylo | 5a520a9f5c461ede0f32acc284017b737a43898c | [
"Apache-2.0"
] | null | null | null | gcc-gcc-7_3_0-release/gcc/ada/s-solita.ads | best08618/asylo | 5a520a9f5c461ede0f32acc284017b737a43898c | [
"Apache-2.0"
] | 2 | 2020-07-27T00:22:36.000Z | 2021-04-01T09:41:02.000Z | ------------------------------------------------------------------------------
-- --
-- GNAT COMPILER COMPONENTS --
-- --
-- S Y S T E M . S O F T _ L I N K S . T A S K I N G --
-- --
-- S p e c --
-- --
-- Copyright (C) 2009-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 tasking versions soft links that are common
-- to the full and the restricted run times. The rest of the required soft
-- links are set by System.Tasking.Initialization and System.Tasking.Stages
-- (full run time) or System.Tasking.Restricted.Stages (restricted run time).
package System.Soft_Links.Tasking is
procedure Init_Tasking_Soft_Links;
-- Set the tasking soft links that are common to the full and the
-- restricted run times. Clients need to make sure the body of
-- System.Secondary_Stack is elaborated before calling this.
end System.Soft_Links.Tasking;
| 66.4 | 78 | 0.451807 |
4a2d71b71b84ca6b614a0bd3c9a1fc90816e3720 | 48 | ads | Ada | dependencies/agar/ada-core/agar.ads | amvb/GUCEF | 08fd423bbb5cdebbe4b70df24c0ae51716b65825 | [
"Apache-2.0"
] | 5 | 2016-04-18T23:12:51.000Z | 2022-03-06T05:12:07.000Z | dependencies/agar/ada-core/agar.ads | amvb/GUCEF | 08fd423bbb5cdebbe4b70df24c0ae51716b65825 | [
"Apache-2.0"
] | 2 | 2015-10-09T19:13:25.000Z | 2018-12-25T17:16:54.000Z | dependencies/agar/ada-core/agar.ads | amvb/GUCEF | 08fd423bbb5cdebbe4b70df24c0ae51716b65825 | [
"Apache-2.0"
] | 15 | 2015-02-23T16:35:28.000Z | 2022-03-25T13:40:33.000Z | package Agar is
pragma Pure (Agar);
end Agar;
| 12 | 21 | 0.708333 |
20a97fb7f6f6c95b9a72d6029207373ffb840df6 | 3,394 | ads | Ada | stm32f1/stm32f103xx/svd/stm32_svd-pwr.ads | ekoeppen/STM32_Generic_Ada_Drivers | 4ff29c3026c4b24280baf22a5b81ea9969375466 | [
"MIT"
] | 1 | 2021-04-06T07:57:56.000Z | 2021-04-06T07:57:56.000Z | stm32f1/stm32f103xx/svd/stm32_svd-pwr.ads | ekoeppen/STM32_Generic_Ada_Drivers | 4ff29c3026c4b24280baf22a5b81ea9969375466 | [
"MIT"
] | null | null | null | stm32f1/stm32f103xx/svd/stm32_svd-pwr.ads | ekoeppen/STM32_Generic_Ada_Drivers | 4ff29c3026c4b24280baf22a5b81ea9969375466 | [
"MIT"
] | 2 | 2018-05-29T13:59:31.000Z | 2019-02-03T19:48:08.000Z | -- This spec has been automatically generated from STM32F103.svd
pragma Restrictions (No_Elaboration_Code);
pragma Ada_2012;
pragma Style_Checks (Off);
with System;
package STM32_SVD.PWR is
pragma Preelaborate;
---------------
-- Registers --
---------------
subtype CR_LPDS_Field is STM32_SVD.Bit;
subtype CR_PDDS_Field is STM32_SVD.Bit;
subtype CR_CWUF_Field is STM32_SVD.Bit;
subtype CR_CSBF_Field is STM32_SVD.Bit;
subtype CR_PVDE_Field is STM32_SVD.Bit;
subtype CR_PLS_Field is STM32_SVD.UInt3;
subtype CR_DBP_Field is STM32_SVD.Bit;
-- Power control register (PWR_CR)
type CR_Register is record
-- Low Power Deep Sleep
LPDS : CR_LPDS_Field := 16#0#;
-- Power Down Deep Sleep
PDDS : CR_PDDS_Field := 16#0#;
-- Clear Wake-up Flag
CWUF : CR_CWUF_Field := 16#0#;
-- Clear STANDBY Flag
CSBF : CR_CSBF_Field := 16#0#;
-- Power Voltage Detector Enable
PVDE : CR_PVDE_Field := 16#0#;
-- PVD Level Selection
PLS : CR_PLS_Field := 16#0#;
-- Disable Backup Domain write protection
DBP : CR_DBP_Field := 16#0#;
-- unspecified
Reserved_9_31 : STM32_SVD.UInt23 := 16#0#;
end record
with Volatile_Full_Access, Size => 32,
Bit_Order => System.Low_Order_First;
for CR_Register use record
LPDS at 0 range 0 .. 0;
PDDS at 0 range 1 .. 1;
CWUF at 0 range 2 .. 2;
CSBF at 0 range 3 .. 3;
PVDE at 0 range 4 .. 4;
PLS at 0 range 5 .. 7;
DBP at 0 range 8 .. 8;
Reserved_9_31 at 0 range 9 .. 31;
end record;
subtype CSR_WUF_Field is STM32_SVD.Bit;
subtype CSR_SBF_Field is STM32_SVD.Bit;
subtype CSR_PVDO_Field is STM32_SVD.Bit;
subtype CSR_EWUP_Field is STM32_SVD.Bit;
-- Power control register (PWR_CR)
type CSR_Register is record
-- Read-only. Wake-Up Flag
WUF : CSR_WUF_Field := 16#0#;
-- Read-only. STANDBY Flag
SBF : CSR_SBF_Field := 16#0#;
-- Read-only. PVD Output
PVDO : CSR_PVDO_Field := 16#0#;
-- unspecified
Reserved_3_7 : STM32_SVD.UInt5 := 16#0#;
-- Enable WKUP pin
EWUP : CSR_EWUP_Field := 16#0#;
-- unspecified
Reserved_9_31 : STM32_SVD.UInt23 := 16#0#;
end record
with Volatile_Full_Access, Size => 32,
Bit_Order => System.Low_Order_First;
for CSR_Register use record
WUF at 0 range 0 .. 0;
SBF at 0 range 1 .. 1;
PVDO at 0 range 2 .. 2;
Reserved_3_7 at 0 range 3 .. 7;
EWUP at 0 range 8 .. 8;
Reserved_9_31 at 0 range 9 .. 31;
end record;
-----------------
-- Peripherals --
-----------------
-- Power control
type PWR_Peripheral is record
-- Power control register (PWR_CR)
CR : aliased CR_Register;
-- Power control register (PWR_CR)
CSR : aliased CSR_Register;
end record
with Volatile;
for PWR_Peripheral use record
CR at 16#0# range 0 .. 31;
CSR at 16#4# range 0 .. 31;
end record;
-- Power control
PWR_Periph : aliased PWR_Peripheral
with Import, Address => System'To_Address (16#40007000#);
end STM32_SVD.PWR;
| 30.303571 | 65 | 0.578079 |
0e1e7113f2372bca64bd7939ba7e037b07aac783 | 2,065 | ads | Ada | src/wi2wic-applications.ads | stcarrez/wi2wic | e0a93f50a9fd3c56cad147616e5814599d10855b | [
"Apache-2.0"
] | 2 | 2020-09-26T16:42:03.000Z | 2021-03-28T03:47:05.000Z | src/wi2wic-applications.ads | stcarrez/wi2wic | e0a93f50a9fd3c56cad147616e5814599d10855b | [
"Apache-2.0"
] | null | null | null | src/wi2wic-applications.ads | stcarrez/wi2wic | e0a93f50a9fd3c56cad147616e5814599d10855b | [
"Apache-2.0"
] | null | null | null | -----------------------------------------------------------------------
-- wi2wic -- wi2wic applications
-- 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.Properties;
with Servlet.Filters.Dump;
with Servlet.Filters.Cache_Control;
with Servlet.Core.Files;
with Servlet.Core.Measures;
with Servlet.Core.Rest;
package Wi2wic.Applications is
CONFIG_PATH : constant String := "wi2wic";
CONTEXT_PATH : constant String := "/wi2wic";
type Application_Type is new Servlet.Core.Servlet_Registry with private;
type Application_Access is access all Application_Type'Class;
-- Configures the REST application so that it is ready to handler REST
-- operations as well as give access to the Swagger UI that describes them.
not overriding
procedure Configure (App : in out Application_Type;
Config : in Util.Properties.Manager'Class);
private
type Application_Type is new Servlet.Core.Servlet_Registry with record
Api : aliased Servlet.Core.Rest.Rest_Servlet;
Measures : aliased Servlet.Core.Measures.Measure_Servlet;
Files : aliased Servlet.Core.Files.File_Servlet;
No_Cache : aliased Servlet.Filters.Cache_Control.Cache_Control_Filter;
Dump : aliased Servlet.Filters.Dump.Dump_Filter;
end record;
end Wi2wic.Applications;
| 41.3 | 86 | 0.670218 |
20544d0b35b070e9020e3ca242bc0f2e76c6f830 | 26,287 | adb | Ada | dictionary_form.adb | ddugovic/words | 13c2fc67d5b75259318cb4c9d23d3abcb7e5efbe | [
"MIT"
] | 4 | 2016-10-30T13:30:55.000Z | 2021-09-25T21:29:17.000Z | dictionary_form.adb | ddugovic/words | 13c2fc67d5b75259318cb4c9d23d3abcb7e5efbe | [
"MIT"
] | 1 | 2020-09-29T02:56:42.000Z | 2020-10-06T18:50:42.000Z | dictionary_form.adb | ddugovic/words | 13c2fc67d5b75259318cb4c9d23d3abcb7e5efbe | [
"MIT"
] | 7 | 2016-07-07T20:40:08.000Z | 2021-10-18T21:11:06.000Z | with TEXT_IO;
with STRINGS_PACKAGE; use STRINGS_PACKAGE;
with INFLECTIONS_PACKAGE; use INFLECTIONS_PACKAGE;
with DICTIONARY_PACKAGE; use DICTIONARY_PACKAGE;
function 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: 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) = NULL_STEM_TYPE and
DE.STEMS(3) = NULL_STEM_TYPE and
DE.STEMS(4) = 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
if DE.PART.N.DECL.WHICH = 1 then
if DE.PART.N.DECL.VAR = 1 then
OX(1) := ADD(DE.STEMS(1), "a");
OX(2) := ADD(DE.STEMS(2), "ae");
elsif DE.PART.N.DECL.VAR = 6 then
OX(1) := ADD(DE.STEMS(1), "e");
OX(2) := ADD(DE.STEMS(2), "es");
elsif DE.PART.N.DECL.VAR = 7 then
OX(1) := ADD(DE.STEMS(1), "es");
OX(2) := ADD(DE.STEMS(2), "ae");
elsif DE.PART.N.DECL.VAR = 8 then
OX(1) := ADD(DE.STEMS(1), "as");
OX(2) := ADD(DE.STEMS(2), "ae");
end if;
elsif DE.PART.N.DECL.WHICH = 2 then
if DE.PART.N.DECL.VAR = 1 then
OX(1) := ADD(DE.STEMS(1), "us");
OX(2) := ADD(DE.STEMS(2), "i");
elsif DE.PART.N.DECL.VAR = 2 then
OX(1) := ADD(DE.STEMS(1), "um");
OX(2) := ADD(DE.STEMS(2), "i");
elsif DE.PART.N.DECL.VAR = 3 then
OX(1) := ADD(DE.STEMS(1), "");
OX(2) := ADD(DE.STEMS(2), "i");
elsif DE.PART.N.DECL.VAR = 4 then
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)");
elsif DE.PART.N.DECL.VAR = 5 then
OX(1) := ADD(DE.STEMS(1), "us");
OX(2) := ADD(DE.STEMS(2), "");
elsif DE.PART.N.DECL.VAR = 6 then
OX(1) := ADD(DE.STEMS(1), "os");
OX(2) := ADD(DE.STEMS(2), "i");
elsif DE.PART.N.DECL.VAR = 7 then
OX(1) := ADD(DE.STEMS(1), "os");
OX(2) := ADD(DE.STEMS(2), "i");
elsif DE.PART.N.DECL.VAR = 8 then
OX(1) := ADD(DE.STEMS(1), "on");
OX(2) := ADD(DE.STEMS(2), "i");
elsif DE.PART.N.DECL.VAR = 9 then
OX(1) := ADD(DE.STEMS(1), "us");
OX(2) := ADD(DE.STEMS(2), "i");
end if;
elsif DE.PART.N.DECL.WHICH = 3 then
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;
elsif DE.PART.N.DECL.WHICH = 4 then
if DE.PART.N.DECL.VAR = 1 then
OX(1) := ADD(DE.STEMS(1), "us");
OX(2) := ADD(DE.STEMS(2), "us");
elsif DE.PART.N.DECL.VAR = 2 then
OX(1) := ADD(DE.STEMS(1), "u");
OX(2) := ADD(DE.STEMS(2), "us");
elsif DE.PART.N.DECL.VAR = 3 then
OX(1) := ADD(DE.STEMS(1), "us");
OX(2) := ADD(DE.STEMS(2), "u");
end if;
elsif DE.PART.N.DECL.WHICH = 5 then
OX(1) := ADD(DE.STEMS(1), "es");
OX(2) := ADD(DE.STEMS(2), "ei");
elsif DE.PART.N.DECL = (9, 8) then
OX(1) := ADD(DE.STEMS(1), ".");
OX(2) := ADD(NULL_OX, "abb.");
elsif DE.PART.N.DECL = (9, 9) then
OX(1) := ADD(DE.STEMS(1), "");
OX(2) := ADD(NULL_OX, "undeclined");
else
raise NOT_FOUND;
end if; -- N
elsif DE.PART.POFS = PRON then
if DE.PART.PRON.DECL.WHICH = 1 then
raise NOT_FOUND;
elsif DE.PART.PRON.DECL.WHICH = 3 then
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;
elsif DE.PART.PRON.DECL.WHICH = 4 then
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;
elsif DE.PART.PRON.DECL.WHICH = 6 then
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;
elsif DE.PART.ADJ.DECL = (9, 8) then
OX(1) := ADD(DE.STEMS(1), ".");
OX(2) := ADD(NULL_OX, "abb.");
elsif DE.PART.PRON.DECL = (9, 9) then
OX(1) := ADD(DE.STEMS(1), "");
OX(2) := ADD(NULL_OX, "undeclined");
else
raise NOT_FOUND;
end if; -- PRON
elsif DE.PART.POFS = ADJ then
--TEXT_IO.NEW_LINE;
--DICTIONARY_ENTRY_IO.PUT(DE);
--TEXT_IO.NEW_LINE;
if DE.PART.ADJ.CO = COMP then
OX(1) := ADD(DE.STEMS(1), "or");
OX(2) := ADD(DE.STEMS(1), "or");
OX(3) := ADD(DE.STEMS(1), "us");
elsif DE.PART.ADJ.CO = SUPER then
OX(1) := ADD(DE.STEMS(1), "mus");
OX(2) := ADD(DE.STEMS(1), "ma");
OX(3) := ADD(DE.STEMS(1), "mum");
elsif DE.PART.ADJ.CO = POS then
if DE.PART.ADJ.DECL.WHICH = 1 then
if DE.PART.ADJ.DECL.VAR = 1 then
OX(1) := ADD(DE.STEMS(1), "us");
OX(2) := ADD(DE.STEMS(2), "a");
OX(3) := ADD(DE.STEMS(2), "um");
elsif DE.PART.ADJ.DECL.VAR = 2 then
OX(1) := ADD(DE.STEMS(1), "");
OX(2) := ADD(DE.STEMS(2), "a");
OX(3) := ADD(DE.STEMS(2), "um");
elsif DE.PART.ADJ.DECL.VAR = 3 then
OX(1) := ADD(DE.STEMS(1), "us");
OX(2) := ADD(DE.STEMS(2), "a");
OX(3) := ADD(DE.STEMS(2), "um (gen -ius)");
elsif DE.PART.ADJ.DECL.VAR = 4 then
OX(1) := ADD(DE.STEMS(1), "");
OX(2) := ADD(DE.STEMS(2), "a");
OX(3) := ADD(DE.STEMS(2), "um");
elsif DE.PART.ADJ.DECL.VAR = 5 then
OX(1) := ADD(DE.STEMS(1), "us");
OX(2) := ADD(DE.STEMS(2), "a");
OX(3) := ADD(DE.STEMS(2), "ud");
else
raise NOT_FOUND;
end if;
elsif DE.PART.ADJ.DECL.WHICH = 2 then
if DE.PART.ADJ.DECL.VAR = 1 then
OX(1) := ADD(NULL_OX, "-");
OX(2) := ADD(DE.STEMS(1), "e");
OX(3) := ADD(NULL_OX, "-");
elsif DE.PART.ADJ.DECL.VAR = 2 then
OX(1) := ADD(NULL_OX, "-");
OX(2) := ADD(NULL_OX, "a");
OX(3) := ADD(NULL_OX, "-");
elsif DE.PART.ADJ.DECL.VAR = 3 then
OX(1) := ADD(DE.STEMS(1), "es");
OX(2) := ADD(DE.STEMS(1), "es");
OX(3) := ADD(DE.STEMS(1), "es");
elsif DE.PART.ADJ.DECL.VAR = 6 then
OX(1) := ADD(DE.STEMS(1), "os");
OX(2) := ADD(DE.STEMS(1), "os");
OX(3) := ADD(NULL_OX, "-");
elsif DE.PART.ADJ.DECL.VAR = 7 then
OX(1) := ADD(DE.STEMS(1), "os");
OX(2) := ADD(NULL_OX, "-");
OX(3) := ADD(NULL_OX, "-");
elsif DE.PART.ADJ.DECL.VAR = 8 then
OX(1) := ADD(NULL_OX, "-");
OX(2) := ADD(NULL_OX, "-");
OX(3) := ADD(DE.STEMS(2), "on");
end if;
elsif DE.PART.ADJ.DECL.WHICH = 3 then
if DE.PART.ADJ.DECL.VAR = 1 then
OX(1) := ADD(DE.STEMS(1), "");
OX(2) := ADD(NULL_OX, "(gen.)");
OX(3) := ADD(DE.STEMS(2), "is");
elsif DE.PART.ADJ.DECL.VAR = 2 then
OX(1) := ADD(DE.STEMS(1), "is");
OX(2) := ADD(DE.STEMS(2), "is");
OX(3) := ADD(DE.STEMS(2), "e");
elsif DE.PART.ADJ.DECL.VAR = 3 then
OX(1) := ADD(DE.STEMS(1), "");
OX(2) := ADD(DE.STEMS(2), "is");
OX(3) := ADD(DE.STEMS(2), "e");
elsif DE.PART.ADJ.DECL.VAR = 6 then
OX(1) := ADD(DE.STEMS(1), "");
OX(2) := ADD(NULL_OX, "(gen.)");
OX(3) := ADD(DE.STEMS(2), "os");
end if;
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;
elsif DE.PART.ADJ.CO = X then
if DE.PART.ADJ.DECL.WHICH = 1 then
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;
elsif DE.PART.ADJ.DECL.WHICH = 3 then
if DE.PART.ADJ.DECL.VAR = 1 then
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");
elsif DE.PART.ADJ.DECL.VAR = 2 then
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");
elsif DE.PART.ADJ.DECL.VAR = 3 then
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");
end if;
elsif DE.PART.ADJ.DECL.WHICH = 9 then
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");
else
raise NOT_FOUND;
end if;
else
raise NOT_FOUND;
end if;
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");
if DE.PART.V.CON.WHICH = 1 then
OX(1) := ADD(DE.STEMS(1), "or");
OX(2) := ADD(DE.STEMS(2), "ari");
elsif DE.PART.V.CON.WHICH = 2 then
OX(1) := ADD(DE.STEMS(1), "eor");
OX(2) := ADD(DE.STEMS(2), "eri");
elsif DE.PART.V.CON.WHICH = 3 then
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;
-- elsif DE.PART.V.CON.WHICH = 4 then -- 4th amy be 3,4 or 4,1
-- OX(1) := ADD(DE.STEMS(1), "or"); -- depending on where in code
-- OX(2) := ADD(DE.STEMS(2), "iri"); -- In practice there is no problem
else
raise NOT_FOUND;
end if; -- 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
if DE.PART.V.CON.WHICH = 1 then
OX(1) := ADD(DE.STEMS(1), "at");
elsif DE.PART.V.CON.WHICH = 2 then
OX(1) := ADD(DE.STEMS(1), "et");
elsif DE.PART.V.CON.WHICH = 3 then
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;
elsif DE.PART.V.CON.WHICH = 5 then
if DE.PART.V.CON.VAR = 1 then
OX(1) := ADD(DE.STEMS(1), "est");
end if;
elsif DE.PART.V.CON.WHICH = 7 then
if DE.PART.V.CON.VAR = 1 or
DE.PART.V.CON.VAR = 2 then
OX(1) := ADD(DE.STEMS(1), "t");
end if;
end if;
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; -- /= IMPERS handled
--end if;
-- OX(1) handled
end if;
-- OX 2
if DE.PART.V.CON.WHICH = 1 then
OX(2) := ADD(DE.STEMS(2), "are");
elsif DE.PART.V.CON.WHICH = 2 then
OX(2) := ADD(DE.STEMS(2), "ere");
elsif DE.PART.V.CON.WHICH = 3 then
if DE.PART.V.CON.VAR = 2 then
OX(2) := ADD(DE.STEMS(2), "re");
elsif DE.PART.V.CON.VAR = 3 then
OX(2) := ADD(DE.STEMS(2), "eri");
elsif DE.PART.V.CON.VAR = 4 then
OX(2) := ADD(DE.STEMS(2), "ire");
else
OX(2) := ADD(DE.STEMS(2), "ere");
end if;
-- elsif DE.PART.V.CON.WHICH = 4 then
-- OX(2) := ADD(DE.STEMS(2), "ire");
elsif DE.PART.V.CON.WHICH = 5 then
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;
elsif DE.PART.V.CON.WHICH = 6 then
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;
elsif DE.PART.V.CON.WHICH = 7 then
if DE.PART.V.CON.VAR = 3 then
OX(2) := ADD(DE.STEMS(2), "se");
end if;
elsif DE.PART.V.CON.WHICH = 8 then
if DE.PART.V.CON.VAR = 1 then
OX(2) := ADD(DE.STEMS(2), "are");
elsif DE.PART.V.CON.VAR = 2 then
OX(2) := ADD(DE.STEMS(2), "ere");
elsif DE.PART.V.CON.VAR = 3 then
OX(2) := ADD(DE.STEMS(2), "ere");
elsif DE.PART.V.CON.VAR = 4 then
OX(2) := ADD(DE.STEMS(2), "ire");
else
OX(2) := ADD(DE.STEMS(2), "ere");
end if;
elsif DE.PART.V.CON = (9, 8) then
OX(1) := ADD(DE.STEMS(1), ".");
OX(2) := ADD(NULL_OX, "abb.");
elsif DE.PART.V.CON = (9, 9) then
OX(1) := ADD(DE.STEMS(1), "");
OX(2) := ADD(NULL_OX, "undeclined");
end if; -- 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
if DE.PART.NUM.DECL.VAR = 1 then
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), "");
elsif DE.PART.NUM.DECL.VAR = 2 then
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), "");
elsif DE.PART.NUM.DECL.VAR = 3 then
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), "");
elsif DE.PART.NUM.DECL.VAR = 4 then
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");
end if;
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
if DE.PART.NUM.DECL.VAR = 1 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.NUM.DECL.VAR = 2 then
OX(1) := ADD(DE.STEMS(1), "o");
OX(2) := ADD(DE.STEMS(1), "ae");
OX(3) := ADD(DE.STEMS(1), "o");
elsif DE.PART.NUM.DECL.VAR = 3 then
OX(1) := ADD(DE.STEMS(1), "es");
OX(2) := ADD(DE.STEMS(1), "es");
OX(3) := ADD(DE.STEMS(1), "ia");
elsif DE.PART.NUM.DECL.VAR = 4 then
OX(1) := ADD(DE.STEMS(1), "i");
OX(2) := ADD(DE.STEMS(1), "ae");
OX(3) := ADD(DE.STEMS(1), "a");
end if;
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 DICTIONARY_FORM;
| 39.410795 | 88 | 0.393008 |
d0eded09f5f89c1dbbea68ac8522540ae6c0b78e | 3,149 | ads | Ada | tools/scitools/conf/understand/ada/ada05/s-pack22.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/ada05/s-pack22.ads | brucegua/moocos | 575c161cfa35e220f10d042e2e5ca18773691695 | [
"Apache-2.0"
] | null | null | null | tools/scitools/conf/understand/ada/ada05/s-pack22.ads | brucegua/moocos | 575c161cfa35e220f10d042e2e5ca18773691695 | [
"Apache-2.0"
] | null | null | null | ------------------------------------------------------------------------------
-- --
-- GNAT RUN-TIME COMPONENTS --
-- --
-- S Y S T E M . P A C K _ 2 2 --
-- --
-- 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. --
-- --
--
--
--
--
--
--
--
-- GNAT was originally developed by the GNAT team at New York University. --
-- Extensive contributions were provided by Ada Core Technologies Inc. --
-- --
------------------------------------------------------------------------------
-- Handling of packed arrays with Component_Size = 22
package System.Pack_22 is
pragma Preelaborate;
Bits : constant := 22;
type Bits_22 is mod 2 ** Bits;
for Bits_22'Size use Bits;
function Get_22 (Arr : System.Address; N : Natural) return Bits_22;
-- Arr is the address of the packed array, N is the zero-based
-- subscript. This element is extracted and returned.
procedure Set_22 (Arr : System.Address; N : Natural; E : Bits_22);
-- Arr is the address of the packed array, N is the zero-based
-- subscript. This element is set to the given value.
function GetU_22 (Arr : System.Address; N : Natural) return Bits_22;
-- Arr is the address of the packed array, N is the zero-based
-- subscript. This element is extracted and returned. This version
-- is used when Arr may represent an unaligned address.
procedure SetU_22 (Arr : System.Address; N : Natural; E : Bits_22);
-- Arr is the address of the packed array, N is the zero-based
-- subscript. This element is set to the given value. This version
-- is used when Arr may represent an unaligned address
end System.Pack_22;
| 49.984127 | 78 | 0.485551 |
4a604b08e835cbd4faff68d5466ad5e52bede35a | 5,577 | adb | Ada | bb-runtimes/runtimes/ravenscar-sfp-stm32f3x4/gnarl/a-exetim.adb | JCGobbi/Nucleo-STM32F334R8 | 2a0b1b4b2664c92773703ac5e95dcb71979d051c | [
"BSD-3-Clause"
] | null | null | null | bb-runtimes/runtimes/ravenscar-sfp-stm32f3x4/gnarl/a-exetim.adb | JCGobbi/Nucleo-STM32F334R8 | 2a0b1b4b2664c92773703ac5e95dcb71979d051c | [
"BSD-3-Clause"
] | null | null | null | bb-runtimes/runtimes/ravenscar-sfp-stm32f3x4/gnarl/a-exetim.adb | JCGobbi/Nucleo-STM32F334R8 | 2a0b1b4b2664c92773703ac5e95dcb71979d051c | [
"BSD-3-Clause"
] | null | null | null | ------------------------------------------------------------------------------
-- --
-- GNAT RUN-TIME COMPONENTS --
-- --
-- A D A . E X E C U T I O N _ T I M E --
-- --
-- B o d y --
-- --
-- Copyright (C) 2007-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 Bare Board version of this package
with Ada.Task_Identification; use Ada.Task_Identification;
with Ada.Unchecked_Conversion;
with System.Tasking;
with System.Task_Primitives.Operations;
with System.BB.Execution_Time;
with System.BB.Time;
with System.BB.Threads;
package body Ada.Execution_Time is
package BB_Exec_Time renames System.BB.Execution_Time;
function To_CPU_Time is new Ada.Unchecked_Conversion
(System.BB.Time.Time, CPU_Time);
-- Function to change the view from System.BB.Time.Time (unsigned 64-bit)
-- to CPU_Time (unsigned 64-bit).
--
-- CPU_Time is derived from Ada.Real_Time.Time which is derived from
-- System.BB.Time.Time. So CPU_Time and System.BB.Time.Time are the same
-- type, but Ada.Real_Time.Time is private so we don't have visibility.
---------
-- "+" --
---------
function "+"
(Left : CPU_Time;
Right : Ada.Real_Time.Time_Span) return CPU_Time
is
use type Ada.Real_Time.Time;
begin
return CPU_Time (Ada.Real_Time.Time (Left) + Right);
end "+";
function "+"
(Left : Ada.Real_Time.Time_Span;
Right : CPU_Time) return CPU_Time
is
use type Ada.Real_Time.Time;
begin
return CPU_Time (Left + Ada.Real_Time.Time (Right));
end "+";
---------
-- "-" --
---------
function "-"
(Left : CPU_Time;
Right : Ada.Real_Time.Time_Span) return CPU_Time
is
use type Ada.Real_Time.Time;
begin
return CPU_Time (Ada.Real_Time.Time (Left) - Right);
end "-";
function "-"
(Left : CPU_Time;
Right : CPU_Time) return Ada.Real_Time.Time_Span
is
use type Ada.Real_Time.Time;
begin
return (Ada.Real_Time.Time (Left) - Ada.Real_Time.Time (Right));
end "-";
-----------
-- Clock --
-----------
function Clock
(T : Ada.Task_Identification.Task_Id :=
Ada.Task_Identification.Current_Task) return CPU_Time
is
function To_Task_Id is new Ada.Unchecked_Conversion
(Ada.Task_Identification.Task_Id, System.Tasking.Task_Id);
Th : System.BB.Threads.Thread_Id;
begin
if T = Ada.Task_Identification.Null_Task_Id then
raise Program_Error;
end if;
Th := System.Task_Primitives.Operations.Get_Thread_Id (To_Task_Id (T));
return To_CPU_Time (BB_Exec_Time.Thread_Clock (Th));
end Clock;
-----------
-- Split --
-----------
procedure Split
(T : CPU_Time;
SC : out Ada.Real_Time.Seconds_Count;
TS : out Ada.Real_Time.Time_Span)
is
begin
Ada.Real_Time.Split (Ada.Real_Time.Time (T), SC, TS);
end Split;
-------------
-- Time_Of --
-------------
function Time_Of
(SC : Ada.Real_Time.Seconds_Count;
TS : Ada.Real_Time.Time_Span := Ada.Real_Time.Time_Span_Zero)
return CPU_Time
is
begin
return CPU_Time (Ada.Real_Time.Time_Of (SC, TS));
end Time_Of;
--------------------------
-- Clock_For_Interrupts --
--------------------------
function Clock_For_Interrupts return CPU_Time is
begin
return To_CPU_Time (BB_Exec_Time.Global_Interrupt_Clock);
end Clock_For_Interrupts;
end Ada.Execution_Time;
| 35.075472 | 78 | 0.487897 |
0e2fdf4c93efdb90a0144aeded92287baab56a7f | 6,027 | ads | Ada | Validation/pyFrame3DD-master/gcc-master/gcc/ada/libgnat/g-encstr.ads | djamal2727/Main-Bearing-Analytical-Model | 2f00c2219c71be0175c6f4f8f1d4cca231d97096 | [
"Apache-2.0"
] | null | null | null | Validation/pyFrame3DD-master/gcc-master/gcc/ada/libgnat/g-encstr.ads | djamal2727/Main-Bearing-Analytical-Model | 2f00c2219c71be0175c6f4f8f1d4cca231d97096 | [
"Apache-2.0"
] | null | null | null | Validation/pyFrame3DD-master/gcc-master/gcc/ada/libgnat/g-encstr.ads | djamal2727/Main-Bearing-Analytical-Model | 2f00c2219c71be0175c6f4f8f1d4cca231d97096 | [
"Apache-2.0"
] | null | null | null | ------------------------------------------------------------------------------
-- --
-- GNAT RUN-TIME COMPONENTS --
-- --
-- G N A T . E N C O D E _ S T R I N G --
-- --
-- S p e c --
-- --
-- Copyright (C) 2007-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 generic package provides utility routines for converting from
-- Wide_String or Wide_Wide_String to encoded String using a specified
-- encoding convention, which is supplied as the generic parameter. If
-- this parameter is a known at compile time constant (e.g. a constant
-- defined in System.WCh_Con), the instantiation is specialized so that
-- it applies only to this specified coding.
-- Note: this package is only about encoding sequences of 16- or 32-bit
-- characters into a sequence of 8-bit codes. It knows nothing at all about
-- the character encodings being used for the input Wide_Character and
-- Wide_Wide_Character values, although some of the encoding methods (notably
-- JIS and EUC) have built in assumptions about the range of possible input
-- code values. Most often the input will be Unicode/ISO-10646 as specified by
-- the Ada RM, but this package does not make any assumptions about the
-- character coding, and in the case of UTF-8 all possible code values can be
-- encoded. See also the packages Ada.Wide_[Wide_]Characters.Unicode for
-- unicode specific functions.
-- Note on brackets encoding (WCEM_Brackets). On input, upper half characters
-- can be represented as ["hh"] but the routines in this package will only use
-- brackets encodings for codes higher than 16#FF#, so upper half characters
-- will be output as single Character values.
with System.WCh_Con;
generic
Encoding_Method : System.WCh_Con.WC_Encoding_Method;
package GNAT.Encode_String is
pragma Pure;
function Encode_Wide_String (S : Wide_String) return String;
pragma Inline (Encode_Wide_String);
-- Encode the given Wide_String, returning a String encoded using the
-- given encoding method. Constraint_Error will be raised if the encoding
-- method cannot accommodate the input data.
procedure Encode_Wide_String
(S : Wide_String;
Result : out String;
Length : out Natural);
-- Encode the given Wide_String, storing the encoded string in Result,
-- with Length being set to the length of the encoded string. The caller
-- must ensure that Result is long enough (see useful constants defined
-- in System.WCh_Con: WC_Longest_Sequence, WC_Longest_Sequences). If the
-- length of Result is insufficient Constraint_Error will be raised.
-- Constraint_Error will also be raised if the encoding method cannot
-- accommodate the input data.
function Encode_Wide_Wide_String (S : Wide_Wide_String) return String;
pragma Inline (Encode_Wide_Wide_String);
-- Same as above function but for Wide_Wide_String input
procedure Encode_Wide_Wide_String
(S : Wide_Wide_String;
Result : out String;
Length : out Natural);
-- Same as above procedure, but for Wide_Wide_String input
procedure Encode_Wide_Character
(Char : Wide_Character;
Result : in out String;
Ptr : in out Natural);
pragma Inline (Encode_Wide_Character);
-- This is a lower level procedure that encodes the single character Char.
-- The output is stored in Result starting at Result (Ptr), and Ptr is
-- updated past the stored value. Constraint_Error is raised if Result
-- is not long enough to accommodate the result, or if the encoding method
-- specified does not accommodate the input character value, or if Ptr is
-- outside the bounds of the Result string.
procedure Encode_Wide_Wide_Character
(Char : Wide_Wide_Character;
Result : in out String;
Ptr : in out Natural);
-- Same as above procedure but with Wide_Wide_Character input
end GNAT.Encode_String;
| 54.790909 | 79 | 0.590841 |
232672985d57f410ffe38abea3062921be866858 | 7,908 | ads | Ada | llvm-gcc-4.2-2.9/gcc/ada/a-ststio.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-ststio.ads | vidkidz/crossbridge | ba0bf94aee0ce6cf7eb5be882382e52bc57ba396 | [
"MIT"
] | null | null | null | llvm-gcc-4.2-2.9/gcc/ada/a-ststio.ads | vidkidz/crossbridge | ba0bf94aee0ce6cf7eb5be882382e52bc57ba396 | [
"MIT"
] | null | null | null | ------------------------------------------------------------------------------
-- --
-- GNAT RUN-TIME COMPONENTS --
-- --
-- A D A . S T R E A M S . S T R E A M _ I O --
-- --
-- S p e c --
-- --
-- Copyright (C) 1992-2006, 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 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 Ada.IO_Exceptions;
with System.File_Control_Block;
package Ada.Streams.Stream_IO is
type Stream_Access is access all Root_Stream_Type'Class;
type File_Type is limited private;
type File_Mode is (In_File, Out_File, Append_File);
-- The following representation clause allows the use of unchecked
-- conversion for rapid translation between the File_Mode type
-- used in this package and System.File_IO.
for File_Mode use
(In_File => 0, -- System.File_IO.File_Mode'Pos (In_File)
Out_File => 2, -- System.File_IO.File_Mode'Pos (Out_File)
Append_File => 3); -- System.File_IO.File_Mode'Pos (Append_File)
type Count is new Stream_Element_Offset
range 0 .. Stream_Element_Offset'Last;
subtype Positive_Count is Count range 1 .. Count'Last;
-- Index into file, in stream elements
---------------------
-- File Management --
---------------------
procedure Create
(File : in out File_Type;
Mode : File_Mode := Out_File;
Name : String := "";
Form : String := "");
procedure Open
(File : in out File_Type;
Mode : File_Mode;
Name : String;
Form : String := "");
procedure Close (File : in out File_Type);
procedure Delete (File : in out File_Type);
procedure Reset (File : in out File_Type; Mode : File_Mode);
procedure Reset (File : in out File_Type);
function Mode (File : File_Type) return File_Mode;
function Name (File : File_Type) return String;
function Form (File : File_Type) return String;
function Is_Open (File : File_Type) return Boolean;
function End_Of_File (File : File_Type) return Boolean;
function Stream (File : File_Type) return Stream_Access;
-----------------------------
-- Input-Output Operations --
-----------------------------
procedure Read
(File : File_Type;
Item : out Stream_Element_Array;
Last : out Stream_Element_Offset;
From : Positive_Count);
procedure Read
(File : File_Type;
Item : out Stream_Element_Array;
Last : out Stream_Element_Offset);
procedure Write
(File : File_Type;
Item : Stream_Element_Array;
To : Positive_Count);
procedure Write
(File : File_Type;
Item : Stream_Element_Array);
----------------------------------------
-- Operations on Position within File --
----------------------------------------
procedure Set_Index (File : File_Type; To : Positive_Count);
function Index (File : File_Type) return Positive_Count;
function Size (File : File_Type) return Count;
procedure Set_Mode (File : in out File_Type; Mode : File_Mode);
-- Note: The parameter file is IN OUT in the RM, but this is clearly
-- an oversight, and was intended to be IN, see AI95-00057.
procedure Flush (File : File_Type);
----------------
-- Exceptions --
----------------
Status_Error : exception renames IO_Exceptions.Status_Error;
Mode_Error : exception renames IO_Exceptions.Mode_Error;
Name_Error : exception renames IO_Exceptions.Name_Error;
Use_Error : exception renames IO_Exceptions.Use_Error;
Device_Error : exception renames IO_Exceptions.Device_Error;
End_Error : exception renames IO_Exceptions.End_Error;
Data_Error : exception renames IO_Exceptions.Data_Error;
private
package FCB renames System.File_Control_Block;
-----------------------------
-- Stream_IO Control Block --
-----------------------------
type Operation is (Op_Read, Op_Write, Op_Other);
-- Type used to record last operation (to optimize sequential operations)
type Stream_AFCB is new FCB.AFCB with record
Index : Count := 1;
-- Current Index value
File_Size : Stream_Element_Offset := -1;
-- Cached value of File_Size, so that we do not keep recomputing it
-- when not necessary (otherwise End_Of_File becomes gruesomely slow).
-- A value of minus one means that there is no cached value.
Last_Op : Operation := Op_Other;
-- Last operation performed on file, used to avoid unnecessary
-- repositioning between successive read or write operations.
Update_Mode : Boolean := False;
-- Set if the mode is changed from write to read or vice versa.
-- Indicates that the file has been reopened in update mode.
end record;
type File_Type is access all Stream_AFCB;
function AFCB_Allocate (Control_Block : Stream_AFCB) return FCB.AFCB_Ptr;
procedure AFCB_Close (File : access Stream_AFCB);
procedure AFCB_Free (File : access Stream_AFCB);
procedure Read
(File : in out Stream_AFCB;
Item : out Ada.Streams.Stream_Element_Array;
Last : out Ada.Streams.Stream_Element_Offset);
-- Read operation used when Stream_IO file is treated directly as Stream
procedure Write
(File : in out Stream_AFCB;
Item : Ada.Streams.Stream_Element_Array);
-- Write operation used when Stream_IO file is treated directly as Stream
end Ada.Streams.Stream_IO;
| 40.762887 | 78 | 0.573849 |
4abac8ef7a5df704ec4ee935174770950ddcd3db | 5,833 | ads | Ada | Validation/pyFrame3DD-master/gcc-master/gcc/ada/libgnat/s-stoele.ads | djamal2727/Main-Bearing-Analytical-Model | 2f00c2219c71be0175c6f4f8f1d4cca231d97096 | [
"Apache-2.0"
] | null | null | null | Validation/pyFrame3DD-master/gcc-master/gcc/ada/libgnat/s-stoele.ads | djamal2727/Main-Bearing-Analytical-Model | 2f00c2219c71be0175c6f4f8f1d4cca231d97096 | [
"Apache-2.0"
] | null | null | null | Validation/pyFrame3DD-master/gcc-master/gcc/ada/libgnat/s-stoele.ads | djamal2727/Main-Bearing-Analytical-Model | 2f00c2219c71be0175c6f4f8f1d4cca231d97096 | [
"Apache-2.0"
] | null | null | null | ------------------------------------------------------------------------------
-- --
-- GNAT COMPILER COMPONENTS --
-- --
-- S Y S T E M . S T O R A G E _ E L E M E N T S --
-- --
-- S p e c --
-- --
-- Copyright (C) 2002-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 implementation dependent sections of this file. --
-- --
-- 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. --
-- --
------------------------------------------------------------------------------
-- Warning: declarations in this package are ambiguous with respect to the
-- extra declarations that can be introduced into System using Extend_System.
-- It is a good idea to avoid use clauses for this package.
pragma Compiler_Unit_Warning;
package System.Storage_Elements 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).
-- We also add the pragma Pure_Function to the operations in this package,
-- because otherwise functions with parameters derived from Address are
-- treated as non-pure by the back-end (see exp_ch6.adb). This is because
-- in many cases such a parameter is used to hide read/out access to
-- objects, and it would be unsafe to treat such functions as pure.
type Storage_Offset is range
-(2 ** (Integer'(Standard'Address_Size) - 1)) ..
+(2 ** (Integer'(Standard'Address_Size) - 1)) - Long_Long_Integer'(1);
-- Note: the reason for the Long_Long_Integer qualification here is to
-- avoid a bogus ambiguity when this unit is analyzed in an rtsfind
-- context. It may be possible to remove this in the future, but it is
-- certainly harmless in any case ???
subtype Storage_Count is Storage_Offset range 0 .. Storage_Offset'Last;
type Storage_Element is mod 2 ** Storage_Unit;
for Storage_Element'Size use Storage_Unit;
pragma Universal_Aliasing (Storage_Element);
-- This type is used by the expander to implement aggregate copy
type Storage_Array is
array (Storage_Offset range <>) of aliased Storage_Element;
for Storage_Array'Component_Size use Storage_Unit;
-- Address arithmetic
function "+" (Left : Address; Right : Storage_Offset) return Address;
pragma Convention (Intrinsic, "+");
pragma Inline_Always ("+");
pragma Pure_Function ("+");
function "+" (Left : Storage_Offset; Right : Address) return Address;
pragma Convention (Intrinsic, "+");
pragma Inline_Always ("+");
pragma Pure_Function ("+");
function "-" (Left : Address; Right : Storage_Offset) return Address;
pragma Convention (Intrinsic, "-");
pragma Inline_Always ("-");
pragma Pure_Function ("-");
function "-" (Left, Right : Address) return Storage_Offset;
pragma Convention (Intrinsic, "-");
pragma Inline_Always ("-");
pragma Pure_Function ("-");
function "mod"
(Left : Address;
Right : Storage_Offset) return Storage_Offset;
pragma Convention (Intrinsic, "mod");
pragma Inline_Always ("mod");
pragma Pure_Function ("mod");
-- Conversion to/from integers
type Integer_Address is mod Memory_Size;
function To_Address (Value : Integer_Address) return Address;
pragma Convention (Intrinsic, To_Address);
pragma Inline_Always (To_Address);
pragma Pure_Function (To_Address);
function To_Integer (Value : Address) return Integer_Address;
pragma Convention (Intrinsic, To_Integer);
pragma Inline_Always (To_Integer);
pragma Pure_Function (To_Integer);
end System.Storage_Elements;
| 49.432203 | 79 | 0.565061 |
20183454482f4e50c5df1997b1ffeb2d5d079e01 | 1,197 | ads | Ada | src/termbox.ads | MorganPeterson/termbox_binding | e213afbbf63ca83e7fe06dcd0a1b9c0dd44fdcc7 | [
"MIT"
] | null | null | null | src/termbox.ads | MorganPeterson/termbox_binding | e213afbbf63ca83e7fe06dcd0a1b9c0dd44fdcc7 | [
"MIT"
] | null | null | null | src/termbox.ads | MorganPeterson/termbox_binding | e213afbbf63ca83e7fe06dcd0a1b9c0dd44fdcc7 | [
"MIT"
] | null | null | null | package Termbox is
procedure Tb_Init; -- initialization
pragma Import (C, Tb_Init, "tb_init");
procedure Tb_Shutdown; -- shutdown
pragma Import (C, Tb_Shutdown, "tb_shutdown");
procedure TB_Width; -- width of the terminal screen
pragma Import (C, TB_Width, "tb_width");
procedure TB_Height; -- height of the terminal screen
pragma Import (C, TB_Height, "tb_height");
procedure TB_Clear; -- clear buffer
pragma Import (C, TB_Clear, "tb_clear");
procedure TB_Present; -- sync internal buffer with terminal
pragma Import (C, TB_Present, "tb_present");
procedure TB_Put_Cell;
pragma Import (C, TB_Put_Cell, "tb_put_cell");
procedure TB_Change_Cell;
pragma Import (C, TB_Change_Cell, "tb_change_cell");
procedure TB_Blit; -- drawing functions
pragma Import (C, TB_Blit, "tb_blit");
procedure TB_Select_Input_Mode; -- change input mode
pragma Import (C, TB_Select_Input_Mode, "tb_select_input_mode");
procedure TB_Peek_Event; -- peek a keyboard event
pragma Import (C, TB_Peek_Event, "tb_peek_event");
procedure TB_Poll_Event; -- wait for a keyboard event
pragma Import (C, TB_Poll_Event, "tb_poll_event");
end Termbox;
| 31.5 | 67 | 0.72264 |
0e474e6aa313b2e068e2115e1ac3060fabd647c6 | 675 | ads | Ada | tests/tk-toplevel-toplevel_options_test_data-toplevel_options_tests.ads | thindil/tashy2 | 43fcbadb33c0062b2c8d6138a8238441dec5fd80 | [
"Apache-2.0"
] | 2 | 2020-12-09T07:27:07.000Z | 2021-10-19T13:31:54.000Z | tests/tk-toplevel-toplevel_options_test_data-toplevel_options_tests.ads | thindil/tashy2 | 43fcbadb33c0062b2c8d6138a8238441dec5fd80 | [
"Apache-2.0"
] | null | null | null | tests/tk-toplevel-toplevel_options_test_data-toplevel_options_tests.ads | thindil/tashy2 | 43fcbadb33c0062b2c8d6138a8238441dec5fd80 | [
"Apache-2.0"
] | null | null | null | -- This package has been generated automatically by GNATtest.
-- Do not edit any part of it, see GNATtest documentation for more details.
-- begin read only
with GNATtest_Generated;
package Tk.TopLevel.Toplevel_Options_Test_Data.Toplevel_Options_Tests is
type Test_Toplevel_Options is new GNATtest_Generated.GNATtest_Standard.Tk
.TopLevel
.Toplevel_Options_Test_Data
.Test_Toplevel_Options with
null record;
procedure Test_Configure_0076be_a80d92
(Gnattest_T: in out Test_Toplevel_Options);
-- tk-toplevel.ads:84:4:Configure:Test_Configure_TopLevel
end Tk.TopLevel.Toplevel_Options_Test_Data.Toplevel_Options_Tests;
-- end read only
| 32.142857 | 76 | 0.798519 |
205dc4424071ec2ae344287a564650d525602bf8 | 481 | ads | Ada | source/network-connection_promises.ads | reznikmm/network | d94878500ab8d87310eef5b9c88784e1eb53ba38 | [
"MIT"
] | 1 | 2021-01-14T20:52:45.000Z | 2021-01-14T20:52:45.000Z | source/network-connection_promises.ads | reznikmm/network | d94878500ab8d87310eef5b9c88784e1eb53ba38 | [
"MIT"
] | null | null | null | source/network-connection_promises.ads | reznikmm/network | d94878500ab8d87310eef5b9c88784e1eb53ba38 | [
"MIT"
] | null | null | null | -- SPDX-FileCopyrightText: 2021 Max Reznik <[email protected]>
--
-- SPDX-License-Identifier: MIT
-------------------------------------------------------------
with League.Strings;
with Network.Connections;
with Network.Generic_Promises;
package Network.Connection_Promises is new Network.Generic_Promises
(Resolve_Element => Network.Connections.Connection_Access,
Reject_Element => League.Strings.Universal_String);
pragma Preelaborate (Network.Connection_Promises);
| 30.0625 | 67 | 0.702703 |
0ea538eb11886730ba937dd17613b245d94d33a8 | 4,003 | ads | Ada | llvm-gcc-4.2-2.9/gcc/ada/sem_ch5.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/sem_ch5.ads | vidkidz/crossbridge | ba0bf94aee0ce6cf7eb5be882382e52bc57ba396 | [
"MIT"
] | null | null | null | llvm-gcc-4.2-2.9/gcc/ada/sem_ch5.ads | vidkidz/crossbridge | ba0bf94aee0ce6cf7eb5be882382e52bc57ba396 | [
"MIT"
] | null | null | null | ------------------------------------------------------------------------------
-- --
-- GNAT COMPILER COMPONENTS --
-- --
-- S E M _ C H 5 --
-- --
-- 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. --
-- --
-- GNAT was originally developed by the GNAT team at New York University. --
-- Extensive contributions were provided by Ada Core Technologies Inc. --
-- --
------------------------------------------------------------------------------
with Types; use Types;
package Sem_Ch5 is
procedure Analyze_Assignment (N : Node_Id);
procedure Analyze_Block_Statement (N : Node_Id);
procedure Analyze_Case_Statement (N : Node_Id);
procedure Analyze_Exit_Statement (N : Node_Id);
procedure Analyze_Goto_Statement (N : Node_Id);
procedure Analyze_If_Statement (N : Node_Id);
procedure Analyze_Implicit_Label_Declaration (N : Node_Id);
procedure Analyze_Label (N : Node_Id);
procedure Analyze_Loop_Statement (N : Node_Id);
procedure Analyze_Null_Statement (N : Node_Id);
procedure Analyze_Statements (L : List_Id);
procedure Analyze_Label_Entity (E : Entity_Id);
-- This procedure performs direct analysis of the label entity E. It
-- is used when a label is created by the expander without bothering
-- to insert an N_Implicit_Label_Declaration in the tree. It also takes
-- care of setting Reachable, since labels defined by the expander can
-- be assumed to be reachable.
procedure Check_Possible_Current_Value_Condition (Cnode : Node_Id);
-- Cnode is N_If_Statement, N_Elsif_Part, or N_Iteration_Scheme
-- (the latter when a WHILE condition is present). This call checks
-- if Condition (Cnode) is of the form ([NOT] var op val), where var
-- is a simple object, val is known at compile time, and op is one
-- of the six relational operators. If this is the case, and the
-- Current_Value field of "var" is not set, then it is set to Cnode.
-- See Exp_Util.Set_Current_Value_Condition for further details.
procedure Check_Unreachable_Code (N : Node_Id);
-- This procedure is called with N being the node for a statement that
-- is an unconditional transfer of control. It checks to see if the
-- statement is followed by some other statement, and if so generates
-- an appropriate warning for unreachable code.
end Sem_Ch5;
| 60.651515 | 78 | 0.527854 |
4a7271909d827aedc556723d9a873ee563dca307 | 562 | ads | Ada | src/tools/Dependency_Graph_Extractor/src/command_line.ads | selroc/Renaissance-Ada | 39230b34aced4a9d83831be346ca103136c53715 | [
"BSD-3-Clause"
] | 1 | 2022-03-08T13:00:47.000Z | 2022-03-08T13:00:47.000Z | src/tools/Dependency_Graph_Extractor/src/command_line.ads | selroc/Renaissance-Ada | 39230b34aced4a9d83831be346ca103136c53715 | [
"BSD-3-Clause"
] | null | null | null | src/tools/Dependency_Graph_Extractor/src/command_line.ads | selroc/Renaissance-Ada | 39230b34aced4a9d83831be346ca103136c53715 | [
"BSD-3-Clause"
] | null | null | null | with Ada.Containers.Vectors;
with Ada.Strings.Unbounded;
package Command_Line is
package SU renames Ada.Strings.Unbounded;
package Input_File_Vectors is new Ada.Containers.Vectors
(Index_Type => Positive,
Element_Type => SU.Unbounded_String,
"=" => SU."=");
function Parse_Command_Line
(Input_Files : out Input_File_Vectors.Vector;
Recurse_Projects : out Boolean;
Directory_Prefix : out SU.Unbounded_String;
Output_File : out SU.Unbounded_String)
return Boolean;
end Command_Line;
| 26.761905 | 59 | 0.69395 |
2328f4ed0c0f6120c1e04e0d5830163d74fded64 | 3,803 | adb | Ada | Ada95/src/terminal_interface-curses-forms-field_types-ipv4_address.adb | tizenorg/external.ncurses | eec8a5e3f767faa476f07eb6b54d493fe7920eca | [
"DOC",
"Unlicense"
] | null | null | null | Ada95/src/terminal_interface-curses-forms-field_types-ipv4_address.adb | tizenorg/external.ncurses | eec8a5e3f767faa476f07eb6b54d493fe7920eca | [
"DOC",
"Unlicense"
] | null | null | null | Ada95/src/terminal_interface-curses-forms-field_types-ipv4_address.adb | tizenorg/external.ncurses | eec8a5e3f767faa476f07eb6b54d493fe7920eca | [
"DOC",
"Unlicense"
] | null | null | null | ------------------------------------------------------------------------------
-- --
-- GNAT ncurses Binding --
-- --
-- Terminal_Interface.Curses.Forms.Field_Types.IPV4_Address --
-- --
-- B O D Y --
-- --
------------------------------------------------------------------------------
-- Copyright (c) 1998-2008,2009 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.10 $
-- $Date: 2009/12/26 17:38:58 $
-- 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
C_IPV4_Field_Type : C_Field_Type;
pragma Import (C, C_IPV4_Field_Type, "TYPE_IPV4");
function Set_Fld_Type (F : Field := Fld;
Cft : C_Field_Type := C_IPV4_Field_Type)
return C_Int;
pragma Import (C, Set_Fld_Type, "set_field_type");
Res : Eti_Error;
begin
Res := Set_Fld_Type;
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.IPV4_Address;
| 56.761194 | 78 | 0.462267 |
0e1408850ee5d11544e2dfbe1cfd50530781815e | 2,978 | ads | Ada | src/sdl-hints.ads | mosteo/sdlada | 429c594de613c5ba2f0d7c59f8708956697e14f1 | [
"Zlib"
] | 89 | 2015-01-03T01:41:23.000Z | 2022-02-23T18:21:11.000Z | src/sdl-hints.ads | mosteo/sdlada | 429c594de613c5ba2f0d7c59f8708956697e14f1 | [
"Zlib"
] | 66 | 2015-05-01T00:54:03.000Z | 2022-01-20T04:09:59.000Z | src/sdl-hints.ads | Jellix/sdlada | 997d2ae2da5c75e2ea99cee98372cf5b752519cf | [
"Zlib"
] | 33 | 2015-04-30T23:39:31.000Z | 2022-01-03T13:00:41.000Z | --------------------------------------------------------------------------------------------------------------------
-- Copyright (c) 2013-2020, Luke A. Guest
--
-- 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.
--------------------------------------------------------------------------------------------------------------------
-- SDL.Hints
--
-- Access to library configuration variables.
--------------------------------------------------------------------------------------------------------------------
package SDL.Hints is
pragma Preelaborate;
-- TODO: Make this more robust using more functions and platform specific
-- packages with error checking on returned values?
-- Would be nice to have the compiler only allow that which is allowed on
-- a particular platform.
-- It would be nice to have the binding test the return values as well,
-- raising an exception on values that are just wrong for a particular
-- platform, i.e. direct3d on Linux or Mac? Exception raised!
-- This is raised when something has gone horribly wrong somewhere,
-- i.e. setting the wrong hint on a platform that does not allow it.
Hint_Error : exception;
type Hint is
(Frame_Buffer_Acceleration,
Render_Driver,
Render_OpenGL_Shaders,
Render_Scale_Quality,
Render_VSync,
Video_X11_XVidMode,
Video_X11_Xinerama,
Video_X11_XRandR,
Grab_Keyboard,
Video_Minimise_On_Focus_Loss,
Idle_Timer_Disabled,
IOS_Orientations,
XInput_Enabled, -- win
Game_Controller_Config, -- win, mac, linux
Joystick_Allow_Background_Events,
Allow_Topmost,
Timer_Resolution) with -- win7 and earlier
Discard_Names => True;
type Priorities is (Default, Normal, Override) with
Convention => C;
procedure Clear with
Import => True,
Convention => C,
External_Name => "SDL_ClearHints";
function Get (Name : in Hint) return String;
procedure Set (Name : in Hint; Value : in String);
procedure Set (Name : in Hint; Value : in String; Priority : in Priorities);
end SDL.Hints;
| 40.243243 | 116 | 0.6182 |
207e41f7662ee85402ee17ed5eea2f27e9737d06 | 2,947 | adb | Ada | src/unbounded.adb | ebolar/Unbounded | 6c19b6bbb1cb2b5eac7add0a324aaa4876d7b806 | [
"MIT"
] | null | null | null | src/unbounded.adb | ebolar/Unbounded | 6c19b6bbb1cb2b5eac7add0a324aaa4876d7b806 | [
"MIT"
] | null | null | null | src/unbounded.adb | ebolar/Unbounded | 6c19b6bbb1cb2b5eac7add0a324aaa4876d7b806 | [
"MIT"
] | null | null | null | -- Simple Lambda Calculus interpreter
-- ----------------------------------
-- Parses and reduces Lamdba Calculus statements.
--
-- The syntax roughly corresponds to what could be written in a text on the
-- Lambda Calculus.
-- * Spaces and underscores are ignored
-- * Single letter variable names 'a'..'z'
-- * Single letter Synonyms 'A'..'Z'.
-- * Expressions can be nested with parentheses '('|')'
-- * Functions start with '?', '/' or '&', eg ?<name>.<expression>
-- * # The rest of the line is a comment
-- * any other character generates a SYNTAX_ERROR
--
-- Conventions
-- * Expressions are associative from left to right.
-- ABC == ((AB)C)
-- * ?abc.<expression> is eqivalent to ?a.(?b.(?c.<expression>)))
-- * Longest valid expression wins. Function expresions go to the end of scope.
-- ?abc.ABC == ?abc.((AB)C)
-- ?abc.(AB)C == ?abc.((AB)C)
-- (?abc.AB)C == (?abc.(AB))(C) ie C applied to (?abc.AB)
--
-- The REPL also allows
-- * <synonym>=<expression> - declare or replace a synonym
-- * <synonym>= - delete a synonym
-- * LS - list all synonyms
-- * QUIT|EXIT|<END_OF_FILE> - Exit
-- * TRACE-ON|TRACE-OFF - Turn on/off verbose tracing
--
-- REPL commands are not case sensitive
--
-- Unit testing is performed via the make script.
--
-- Source:
-- lambda - [This file] definitions and helper functions
-- lambda_REPL - REPL and command line parsers
-- lambda_parser - parse tree generator
-- lambda_reducer - optimises and reduces lambda expressions
--
with Lambda; use Lambda;
with lambda_REPL; use lambda_REPL;
-- with lambda_parser_parser; use Lambda;
-- with lambda_reducer; use lambda_reducer;
with Ada.Text_IO; use Ada.Text_IO;
procedure unbounded is
begin
Put_Line(" __");
Put_Line(" \ \");
Put_Line(" ___ \ \");
Put_Line(" ___ . \");
Put_Line(" ___ / ^ \");
Put_Line(" /_/ \_\");
New_Line;
-- If input = terminal and no arguments provided, print the header and prompt for input.
Put_Line("Unbounded, a Lambda Calculus interpreter");
Put_Line("");
-- If args contain -h or invalid arguments then print the help message
Put_Line("Usage: unbounded [-h] [-q | -v] [-e 'expression']");
Put_Line("");
Put ("Default operation is to evaluate expressions in an interactive REPL. ");
Put ("End of input is system defined. ");
Put_Line("");
Put_Line("");
Put_Line(" -h prints this help message.");
Put_Line(" -q run quietly.");
Put_Line(" -v verbose tracing.");
Put_Line(" -e 'expression' evaluate the expression in non-interactive mode.");
Put_Line("");
-- if args contain -q then set quiet_mode
-- elseif args contain -v then set trace_mode;
-- if args contain -e then
-- evaluate expression
-- else
-- The Read|Evaulate|Print Loop
REPL;
-- end if;
end unbounded;
| 33.11236 | 91 | 0.615541 |
0ea5014dd1e5aa7c378acecfd9846a5ba3c889a9 | 1,201 | ads | Ada | src/globals.ads | bracke/websitegenerator | d3aee456f9f0b84e1d4e7030520fac5d8e6c8a1b | [
"CC0-1.0"
] | 1 | 2022-02-14T11:45:43.000Z | 2022-02-14T11:45:43.000Z | src/globals.ads | bracke/websitegenerator | d3aee456f9f0b84e1d4e7030520fac5d8e6c8a1b | [
"CC0-1.0"
] | null | null | null | src/globals.ads | bracke/websitegenerator | d3aee456f9f0b84e1d4e7030520fac5d8e6c8a1b | [
"CC0-1.0"
] | null | null | null | with Ada.Containers.Indefinite_Hashed_Maps;
with Ada.Strings.Hash;
with Ada.Environment_Variables;
with Ada.Text_IO;
with Ada.Strings.Unbounded;
package Globals is
pragma Elaborate_Body;
use Ada.Strings.Unbounded;
Blueprint_Folder_Name : constant String := "blueprints";
Blueprint_Default : constant String := "simple";
HTML_Filetype : constant String := "html";
Front_Matter_Prefix : constant String := "--";
Front_Matter_Separator : constant String := ":";
Posts_Source_Folder_Name : constant String := "_posts";
Pages_Folder_Name : constant String := "pages";
Layout_Folder_Name : constant String := "_layouts";
Dist_Folder_Name : constant String := "_site";
Blog_Target_Folder_Name : constant String := "blog";
Feed_filename : constant String := "rssfeed.xml";
Sitemap_filename : constant String := "sitemap.xml";
Site_Configuration_Name : constant String := "_site.cfg";
Excerpt_Separator : constant String := "<!--more-->";
type OS is (Unix, Windows);
Current_OS : OS := Unix;
Current_Lineending : Unbounded_String;
end Globals; | 38.741935 | 65 | 0.661116 |
0e1014bd2f577fb6b3da019ff2e5cd68cd581fc6 | 1,292 | ads | Ada | source/runtime/pb_support-boolean_vectors.ads | mgrojo/protobuf | ffc50782c0c5bbb60e8f1504fcfc5a5fbafdb7dd | [
"MIT"
] | 12 | 2020-05-04T09:30:21.000Z | 2022-02-08T21:47:32.000Z | source/runtime/pb_support-boolean_vectors.ads | mgrojo/protobuf | ffc50782c0c5bbb60e8f1504fcfc5a5fbafdb7dd | [
"MIT"
] | 6 | 2021-03-16T15:17:33.000Z | 2022-03-31T21:32:47.000Z | source/runtime/pb_support-boolean_vectors.ads | mgrojo/protobuf | ffc50782c0c5bbb60e8f1504fcfc5a5fbafdb7dd | [
"MIT"
] | 1 | 2021-03-16T15:09:27.000Z | 2021-03-16T15:09:27.000Z | -- MIT License
--
-- Copyright (c) 2020 Max Reznik
--
-- 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 PB_Support.Vectors;
package PB_Support.Boolean_Vectors is new PB_Support.Vectors (Boolean);
pragma Preelaborate (PB_Support.Boolean_Vectors);
| 47.851852 | 78 | 0.76161 |
0e83ca5568bab9052e2d06c64204d6e14a3a3882 | 2,432 | ada | Ada | gcc-gcc-7_3_0-release/gcc/testsuite/ada/acats/tests/a/ac1015b.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/a/ac1015b.ada | best08618/asylo | 5a520a9f5c461ede0f32acc284017b737a43898c | [
"Apache-2.0"
] | null | null | null | gcc-gcc-7_3_0-release/gcc/testsuite/ada/acats/tests/a/ac1015b.ada | best08618/asylo | 5a520a9f5c461ede0f32acc284017b737a43898c | [
"Apache-2.0"
] | 2 | 2020-07-27T00:22:36.000Z | 2021-04-01T09:41:02.000Z | -- AC1015B.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 WITHIN A GENERIC SUBPROGRAM THE NAME OF THE GENERIC
-- SUBPROGRAM CAN BE USED AS AN ACTUAL PARAMETER IN AN
-- INSTANTIATION.
-- HISTORY:
-- BCB 03/28/88 CREATED ORIGINAL TEST.
WITH REPORT; USE REPORT;
PROCEDURE AC1015B IS
GENERIC
PROCEDURE P;
PROCEDURE P IS
GENERIC
WITH PROCEDURE F;
PROCEDURE T;
PROCEDURE T IS
BEGIN
NULL;
END T;
PROCEDURE S IS NEW T(F => P);
BEGIN
NULL;
END P;
GENERIC
FUNCTION D RETURN BOOLEAN;
FUNCTION D RETURN BOOLEAN IS
GENERIC
WITH FUNCTION L RETURN BOOLEAN;
FUNCTION A RETURN BOOLEAN;
FUNCTION A RETURN BOOLEAN IS
BEGIN
RETURN TRUE;
END A;
FUNCTION B IS NEW A(L => D);
BEGIN
RETURN TRUE;
END D;
BEGIN
TEST ("AC1015B", "CHECK THAT WITHIN A GENERIC SUBPROGRAM THE " &
"NAME OF THE GENERIC SUBPROGRAM CAN BE USED AS " &
"AN ACTUAL PARAMETER IN AN INSTANTIATION");
RESULT;
END AC1015B;
| 29.658537 | 79 | 0.609786 |
Subsets and Splits