repo_name
stringlengths
9
74
language
stringclasses
1 value
length_bytes
int64
11
9.34M
extension
stringclasses
2 values
content
stringlengths
11
9.34M
reznikmm/matreshka
Ada
6,349
adb
------------------------------------------------------------------------------ -- -- -- Matreshka Project -- -- -- -- Localization, Internationalization, Globalization for Ada -- -- -- -- Tools Component -- -- -- ------------------------------------------------------------------------------ -- -- -- Copyright © 2009, 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 Unicode_Data_File_Parsers is ----------- -- Close -- ----------- not overriding procedure Close (Self : in out Unicode_Data_File_Parser) is begin if Ada.Text_IO.Is_Open (Self.File) then Ada.Text_IO.Close (Self.File); end if; end Close; -------------- -- Finalize -- -------------- overriding procedure Finalize (Self : in out Unicode_Data_File_Parser) is begin Self.Close; end Finalize; ---------- -- Open -- ---------- not overriding procedure Open (Self : in out Unicode_Data_File_Parser; File_Name : String) is begin Ada.Text_IO.Open (Self.File, Ada.Text_IO.In_File, File_Name); end Open; ----------- -- Parse -- ----------- not overriding procedure Parse (Self : in out Unicode_Data_File_Parser) is Separator : Natural; First : Positive; Last : Natural; Fields : String_Vectors.Vector; Section : Boolean := False; begin while not Ada.Text_IO.End_Of_File (Self.File) loop Ada.Text_IO.Get_Line (Self.File, Self.Line, Self.Last); -- Strip comment for J in 1 .. Self.Last loop if Self.Line (J) = '#' then Self.Last := J - 1; exit; end if; end loop; -- Strip trailing spaces for J in reverse 1 .. Self.Last loop if Self.Line (J) /= ' ' then Self.Last := J; exit; end if; end loop; if Self.Last /= 0 then if Self.Line (1) = '@' then if Section then Unicode_Data_File_Parser'Class (Self).End_Section; end if; Unicode_Data_File_Parser'Class (Self).Start_Section (Self.Line (2 .. Self.Last)); Section := True; else Separator := 0; Fields.Clear; while Separator <= Self.Last loop First := Separator + 1; Last := First - 1; while Last < Self.Last loop Last := Last + 1; if Self.Line (Last) = ';' then Last := Last - 1; exit; end if; end loop; Separator := Last + 1; while Self.Line (First) = ' ' loop First := First + 1; end loop; while Self.Line (Last) = ' ' loop Last := Last - 1; end loop; Fields.Append (Self.Line (First .. Last)); end loop; Unicode_Data_File_Parser'Class (Self).Data (Fields); end if; end if; end loop; if Section then Unicode_Data_File_Parser'Class (Self).End_Section; end if; end Parse; end Unicode_Data_File_Parsers;
mirror/ncurses
Ada
3,082
ads
------------------------------------------------------------------------------ -- -- -- GNAT ncurses Binding Samples -- -- -- -- ncurses -- -- -- -- B O D Y -- -- -- ------------------------------------------------------------------------------ -- Copyright 2020 Thomas E. Dickey -- -- Copyright 2000 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: Eugene V. Melaragno <[email protected]> 2000 -- Version Control -- $Revision: 1.2 $ -- Binding Version 01.00 ------------------------------------------------------------------------------ procedure ncurses2.getch_test;
reznikmm/matreshka
Ada
3,739
ads
------------------------------------------------------------------------------ -- -- -- Matreshka Project -- -- -- -- Open Document Toolkit -- -- -- -- Runtime Library Component -- -- -- ------------------------------------------------------------------------------ -- -- -- Copyright © 2014, Vadim Godunko <[email protected]> -- -- All rights reserved. -- -- -- -- Redistribution and use in source and binary forms, with or without -- -- modification, are permitted provided that the following conditions -- -- are met: -- -- -- -- * Redistributions of source code must retain the above copyright -- -- notice, this list of conditions and the following disclaimer. -- -- -- -- * Redistributions in binary form must reproduce the above copyright -- -- notice, this list of conditions and the following disclaimer in the -- -- documentation and/or other materials provided with the distribution. -- -- -- -- * Neither the name of the Vadim Godunko, IE nor the names of its -- -- contributors may be used to endorse or promote products derived from -- -- this software without specific prior written permission. -- -- -- -- THIS SOFTWARE IS PROVIDED BY THE COPYRIGHT HOLDERS AND CONTRIBUTORS -- -- "AS IS" AND ANY EXPRESS OR IMPLIED WARRANTIES, INCLUDING, BUT NOT -- -- LIMITED TO, THE IMPLIED WARRANTIES OF MERCHANTABILITY AND FITNESS FOR -- -- A PARTICULAR PURPOSE ARE DISCLAIMED. IN NO EVENT SHALL THE COPYRIGHT -- -- HOLDER OR CONTRIBUTORS BE LIABLE FOR ANY DIRECT, INDIRECT, INCIDENTAL, -- -- SPECIAL, EXEMPLARY, OR CONSEQUENTIAL DAMAGES (INCLUDING, BUT NOT LIMITED -- -- TO, PROCUREMENT OF SUBSTITUTE GOODS OR SERVICES; LOSS OF USE, DATA, OR -- -- PROFITS; OR BUSINESS INTERRUPTION) HOWEVER CAUSED AND ON ANY THEORY OF -- -- LIABILITY, WHETHER IN CONTRACT, STRICT LIABILITY, OR TORT (INCLUDING -- -- NEGLIGENCE OR OTHERWISE) ARISING IN ANY WAY OUT OF THE USE OF THIS -- -- SOFTWARE, EVEN IF ADVISED OF THE POSSIBILITY OF SUCH DAMAGE. -- -- -- ------------------------------------------------------------------------------ -- $Revision$ $Date$ ------------------------------------------------------------------------------ with XML.DOM.Attributes; package ODF.DOM.Style_Decimal_Places_Attributes is pragma Preelaborate; type ODF_Style_Decimal_Places_Attribute is limited interface and XML.DOM.Attributes.DOM_Attribute; type ODF_Style_Decimal_Places_Attribute_Access is access all ODF_Style_Decimal_Places_Attribute'Class with Storage_Size => 0; end ODF.DOM.Style_Decimal_Places_Attributes;
charlie5/lace
Ada
865
adb
with ada.Numerics.discrete_Random; procedure lace.Containers.shuffle_Vector (the_Vector : in out vectors.Vector) is use type vectors.Index_type; begin for i in reverse 2 .. vectors.Index_type (the_Vector.Length) -- Start from 2, since swapping the loop -- first element with itself is useless. declare subtype Index is vectors.Index_type range vectors.Index_type'First .. vectors.Index_type'First + i - 1; package random_Index is new ada.Numerics.discrete_Random (Index); use random_Index; the_Generator : random_Index.Generator; begin the_Vector.swap (Random (the_Generator), Index'Last); end; end loop; end lace.Containers.shuffle_Vector;
ekoeppen/STM32_Generic_Ada_Drivers
Ada
1,153
ads
with STM32_SVD.GPIO; generic Pin : UInt4; Port : in out STM32_SVD.GPIO.GPIO_Peripheral; Input : Boolean := False; Output : Boolean := False; Alternate_Output : Boolean := False; Analog_Input : Boolean := False; Pull_Up : Boolean := False; Pull_Down : Boolean := False; Open_Drain : Boolean := False; Low_Speed : Boolean := False; Medium_Speed : Boolean := False; High_Speed : Boolean := False; package STM32GD.GPIO is pragma Preelaborate; function Port_Index return UInt4; function Pin_Mask return UInt16 is (2 ** Natural(Pin)); procedure Set_Output; procedure Set_Input; procedure Set_Alternate_Output; procedure Set_Analog_Input; procedure Set_Open_Drain; procedure Set_Push_Pull; procedure Set_Pull_Up; procedure Set_Pull_Down; procedure Set_No_Pull; procedure Init; procedure Configure_Trigger (Rising : Boolean := False; Falling : Boolean := False); procedure Wait_For_Trigger; procedure Clear_Trigger; function Triggered return Boolean; function Is_Set return Boolean; procedure Set; procedure Clear; procedure Toggle; end STM32GD.GPIO;
reznikmm/matreshka
Ada
4,547
ads
------------------------------------------------------------------------------ -- -- -- Matreshka Project -- -- -- -- Web Framework -- -- -- -- Web API Definition -- -- -- ------------------------------------------------------------------------------ -- -- -- Copyright © 2014-2015, 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 package provides binding to interface NodeList ------------------------------------------------------------------------------ with WebAPI.DOM.Nodes; package WebAPI.DOM.Node_Lists is pragma Preelaborate; type Node_List is tagged private with Constant_Indexing => Item; function Item (Self : Node_List'Class; Index : Positive) return WebAPI.DOM.Nodes.Node_Access with Import => True, Convention => JavaScript_Getter, Link_Name => "item"; -- Returns the node with index index from the collection. The nodes are -- sorted in tree order. -- -- The item(index) method must return the indexth node in the collection. -- If there is no indexth node in the collection, then the method must -- return null. function Length (Self : Node_List'Class) return Natural with Import => True, Convention => JavaScript_Property_Getter, Link_Name => "length"; -- Returns the number of nodes in the collection. -- -- The length attribute must return the number of nodes represented by the -- collection. private type Node_List is tagged null record; end WebAPI.DOM.Node_Lists;
danieagle/ASAP-Modular_Hashing
Ada
8,382
ads
------------------------------------------------------------------------------ -- -- -- Modular Hash Infrastructure -- -- -- -- SHA2 (512) -- -- -- -- ------------------------------------------------------------------------ -- -- -- -- Copyright (C) 2019-2021, ANNEXI-STRAYLINE Trans-Human Ltd. -- -- All rights reserved. -- -- -- -- Original Contributors: -- -- * Ensi Martini (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 Interfaces; with Ada.Streams; package Modular_Hashing.SHA512 is type SHA512_Hash is new Hash with private; -- The final hash is a 512-bit message digest, which can also be displayed -- as a 128 character hex string and is 64 bytes long overriding function "<" (Left, Right : SHA512_Hash) return Boolean; overriding function ">" (Left, Right : SHA512_Hash) return Boolean; overriding function "=" (Left, Right : SHA512_Hash) return Boolean; SHA512_Hash_Bytes: constant := 64; overriding function Binary_Bytes (Value: SHA512_Hash) return Positive is (SHA512_Hash_Bytes); overriding function Binary (Value: SHA512_Hash) return Hash_Binary_Value with Post => Binary'Result'Length = SHA512_Hash_Bytes; type SHA512_Engine is new Hash_Algorithm with private; overriding procedure Write (Stream : in out SHA512_Engine; Item : in Ada.Streams.Stream_Element_Array); overriding procedure Reset (Engine : in out SHA512_Engine); overriding function Digest (Engine : in out SHA512_Engine) return Hash'Class; private use Ada.Streams, Interfaces; package U_128 is type Unsigned_128 is record --Internal_Repr : array (1 .. 2) of Unsigned_64 := (others => 0); High : Unsigned_64 := 0; Low : Unsigned_64 := 0; end record; function "+" (Left, Right : Unsigned_128) return Unsigned_128; end U_128; ----------------- -- SHA512_Hash -- ----------------- type Message_Digest is array (1 .. 8) of Unsigned_64; type SHA512_Hash is new Hash with record Digest: Message_Digest; end record; ------------------- -- SHA512_Engine -- ------------------- -- SHA-2 Defined initialization constants H0_Initial: constant := 16#6a09e667f3bcc908#; H1_Initial: constant := 16#bb67ae8584caa73b#; H2_Initial: constant := 16#3c6ef372fe94f82b#; H3_Initial: constant := 16#a54ff53a5f1d36f1#; H4_Initial: constant := 16#510e527fade682d1#; H5_Initial: constant := 16#9b05688c2b3e6c1f#; H6_Initial: constant := 16#1f83d9abfb41bd6b#; H7_Initial: constant := 16#5be0cd19137e2179#; type K_Arr is array (1 .. 80) of Unsigned_64; K : constant K_Arr := (16#428a2f98d728ae22#, 16#7137449123ef65cd#, 16#b5c0fbcfec4d3b2f#, 16#e9b5dba58189dbbc#, 16#3956c25bf348b538#, 16#59f111f1b605d019#, 16#923f82a4af194f9b#, 16#ab1c5ed5da6d8118#, 16#d807aa98a3030242#, 16#12835b0145706fbe#, 16#243185be4ee4b28c#, 16#550c7dc3d5ffb4e2#, 16#72be5d74f27b896f#, 16#80deb1fe3b1696b1#, 16#9bdc06a725c71235#, 16#c19bf174cf692694#, 16#e49b69c19ef14ad2#, 16#efbe4786384f25e3#, 16#0fc19dc68b8cd5b5#, 16#240ca1cc77ac9c65#, 16#2de92c6f592b0275#, 16#4a7484aa6ea6e483#, 16#5cb0a9dcbd41fbd4#, 16#76f988da831153b5#, 16#983e5152ee66dfab#, 16#a831c66d2db43210#, 16#b00327c898fb213f#, 16#bf597fc7beef0ee4#, 16#c6e00bf33da88fc2#, 16#d5a79147930aa725#, 16#06ca6351e003826f#, 16#142929670a0e6e70#, 16#27b70a8546d22ffc#, 16#2e1b21385c26c926#, 16#4d2c6dfc5ac42aed#, 16#53380d139d95b3df#, 16#650a73548baf63de#, 16#766a0abb3c77b2a8#, 16#81c2c92e47edaee6#, 16#92722c851482353b#, 16#a2bfe8a14cf10364#, 16#a81a664bbc423001#, 16#c24b8b70d0f89791#, 16#c76c51a30654be30#, 16#d192e819d6ef5218#, 16#d69906245565a910#, 16#f40e35855771202a#, 16#106aa07032bbd1b8#, 16#19a4c116b8d2d0c8#, 16#1e376c085141ab53#, 16#2748774cdf8eeb99#, 16#34b0bcb5e19b48a8#, 16#391c0cb3c5c95a63#, 16#4ed8aa4ae3418acb#, 16#5b9cca4f7763e373#, 16#682e6ff3d6b2b8a3#, 16#748f82ee5defb2fc#, 16#78a5636f43172f60#, 16#84c87814a1f0ab72#, 16#8cc702081a6439ec#, 16#90befffa23631e28#, 16#a4506cebde82bde9#, 16#bef9a3f7b2c67915#, 16#c67178f2e372532b#, 16#ca273eceea26619c#, 16#d186b8c721c0c207#, 16#eada7dd6cde0eb1e#, 16#f57d4f7fee6ed178#, 16#06f067aa72176fba#, 16#0a637dc5a2c898a6#, 16#113f9804bef90dae#, 16#1b710b35131c471b#, 16#28db77f523047d84#, 16#32caab7b40c72493#, 16#3c9ebe0a15c9bebc#, 16#431d67c49c100d4c#, 16#4cc5d4becb3e42b6#, 16#597f299cfc657e2a#, 16#5fcb6fab3ad6faec#, 16#6c44198c4a475817#); type SHA512_Engine is new Hash_Algorithm with record Last_Element_Index : Stream_Element_Offset := 0; Buffer : Stream_Element_Array(1 .. 128); Message_Length : U_128.Unsigned_128; H0 : Unsigned_64 := H0_Initial; H1 : Unsigned_64 := H1_Initial; H2 : Unsigned_64 := H2_Initial; H3 : Unsigned_64 := H3_Initial; H4 : Unsigned_64 := H4_Initial; H5 : Unsigned_64 := H5_Initial; H6 : Unsigned_64 := H6_Initial; H7 : Unsigned_64 := H7_Initial; end record; end Modular_Hashing.SHA512;
pomadchin/ada-sample
Ada
328
adb
package body ada_io is procedure put(s: in string) renames text_io.put; procedure new_line is begin text_io.New_Line(1); end new_line; procedure put(i: in integer) is begin io.put(i); end put; procedure put(f: in float;a: in integer; b: in integer) is begin rio.put(f,a,b); end put; begin null; end ada_io;
reznikmm/matreshka
Ada
4,396
ads
------------------------------------------------------------------------------ -- -- -- Matreshka Project -- -- -- -- SQL Database Access -- -- -- -- 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: 1562 $ $Date: 2011-03-02 11:40:23 +0200 (Ср, 02 мар 2011) $ ------------------------------------------------------------------------------ -- This package provides implementation of SQL statement parameter rewriter -- for Firebird: every :name parameter placeholder is replaced by $N -- parameter placeholder. Duplicate names are replaced by the same parameter -- placeholder. ------------------------------------------------------------------------------ package Matreshka.Internals.SQL_Parameter_Rewriters.Firebird is type Firebird_Parameter_Rewriter is new Abstract_Parameter_Rewriter with null record; overriding procedure Database_Placeholder (Self : Firebird_Parameter_Rewriter; Name : League.Strings.Universal_String; Number : Positive; Placeholder : out League.Strings.Universal_String; Parameters : in out SQL_Parameter_Sets.Parameter_Set); -- Sets Placeholder to database specific placeholder for parameter with -- Name and number Number. Implementation must modify Parameters -- accordingly. end Matreshka.Internals.SQL_Parameter_Rewriters.Firebird;
kontena/ruby-packer
Ada
9,765
adb
------------------------------------------------------------------------------ -- -- -- GNAT ncurses Binding -- -- -- -- Terminal_Interface.Curses.Text_IO -- -- -- -- B O D Y -- -- -- ------------------------------------------------------------------------------ -- Copyright (c) 1998-2011,2014 Free Software Foundation, Inc. -- -- -- -- Permission is hereby granted, free of charge, to any person obtaining a -- -- copy of this software and associated documentation files (the -- -- "Software"), to deal in the Software without restriction, including -- -- without limitation the rights to use, copy, modify, merge, publish, -- -- distribute, distribute with modifications, sublicense, and/or sell -- -- copies of the Software, and to permit persons to whom the Software is -- -- furnished to do so, subject to the following conditions: -- -- -- -- The above copyright notice and this permission notice shall be included -- -- in all copies or substantial portions of the Software. -- -- -- -- THE SOFTWARE IS PROVIDED "AS IS", WITHOUT WARRANTY OF ANY KIND, EXPRESS -- -- OR IMPLIED, INCLUDING BUT NOT LIMITED TO THE WARRANTIES OF -- -- MERCHANTABILITY, FITNESS FOR A PARTICULAR PURPOSE AND NONINFRINGEMENT. -- -- IN NO EVENT SHALL THE ABOVE COPYRIGHT HOLDERS BE LIABLE FOR ANY CLAIM, -- -- DAMAGES OR OTHER LIABILITY, WHETHER IN AN ACTION OF CONTRACT, TORT OR -- -- OTHERWISE, ARISING FROM, OUT OF OR IN CONNECTION WITH THE SOFTWARE OR -- -- THE USE OR OTHER DEALINGS IN THE SOFTWARE. -- -- -- -- Except as contained in this notice, the name(s) of the above copyright -- -- holders shall not be used in advertising or otherwise to promote the -- -- sale, use or other dealings in this Software without prior written -- -- authorization. -- ------------------------------------------------------------------------------ -- Author: Juergen Pfeifer, 1996 -- Version Control: -- $Revision: 1.22 $ -- $Date: 2014/05/24 21:32:18 $ -- Binding Version 01.00 ------------------------------------------------------------------------------ package body Terminal_Interface.Curses.Text_IO is Default_Window : Window := Null_Window; procedure Set_Window (Win : Window) is begin Default_Window := Win; end Set_Window; function Get_Window return Window is begin if Default_Window = Null_Window then return Standard_Window; else return Default_Window; end if; end Get_Window; pragma Inline (Get_Window); procedure Flush (Win : Window) is begin Refresh (Win); end Flush; procedure Flush is begin Flush (Get_Window); end Flush; -------------------------------------------- -- Specification of line and page lengths -- -------------------------------------------- -- There are no set routines in this package. I assume, that you allocate -- the window with an appropriate size. -- A scroll-window is interpreted as an page with unbounded page length, -- i.e. it returns the conventional 0 as page length. function Line_Length (Win : Window) return Count is N_Lines : Line_Count; N_Cols : Column_Count; begin Get_Size (Win, N_Lines, N_Cols); -- if Natural (N_Cols) > Natural (Count'Last) then -- raise Layout_Error; -- end if; return Count (N_Cols); end Line_Length; function Line_Length return Count is begin return Line_Length (Get_Window); end Line_Length; function Page_Length (Win : Window) return Count is N_Lines : Line_Count; N_Cols : Column_Count; begin if Scrolling_Allowed (Win) then return 0; else Get_Size (Win, N_Lines, N_Cols); -- if Natural (N_Lines) > Natural (Count'Last) then -- raise Layout_Error; -- end if; return Count (N_Lines); end if; end Page_Length; function Page_Length return Count is begin return Page_Length (Get_Window); end Page_Length; ------------------------------------ -- Column, Line, and Page Control -- ------------------------------------ procedure New_Line (Win : Window; Spacing : Positive_Count := 1) is P_Size : constant Count := Page_Length (Win); begin if not Spacing'Valid then raise Constraint_Error; end if; for I in 1 .. Spacing loop if P_Size > 0 and then Line (Win) >= P_Size then New_Page (Win); else Add (Win, ASCII.LF); end if; end loop; end New_Line; procedure New_Line (Spacing : Positive_Count := 1) is begin New_Line (Get_Window, Spacing); end New_Line; procedure New_Page (Win : Window) is begin Clear (Win); end New_Page; procedure New_Page is begin New_Page (Get_Window); end New_Page; procedure Set_Col (Win : Window; To : Positive_Count) is Y : Line_Position; X1 : Column_Position; X2 : Column_Position; N : Natural; begin if not To'Valid then raise Constraint_Error; end if; Get_Cursor_Position (Win, Y, X1); N := Natural (To); N := N - 1; X2 := Column_Position (N); if X1 > X2 then New_Line (Win, 1); X1 := 0; end if; if X1 < X2 then declare Filler : constant String (Integer (X1) .. (Integer (X2) - 1)) := (others => ' '); begin Put (Win, Filler); end; end if; end Set_Col; procedure Set_Col (To : Positive_Count) is begin Set_Col (Get_Window, To); end Set_Col; procedure Set_Line (Win : Window; To : Positive_Count) is Y1 : Line_Position; Y2 : Line_Position; X : Column_Position; N : Natural; begin if not To'Valid then raise Constraint_Error; end if; Get_Cursor_Position (Win, Y1, X); pragma Warnings (Off, X); -- unreferenced N := Natural (To); N := N - 1; Y2 := Line_Position (N); if Y2 < Y1 then New_Page (Win); Y1 := 0; end if; if Y1 < Y2 then New_Line (Win, Positive_Count (Y2 - Y1)); end if; end Set_Line; procedure Set_Line (To : Positive_Count) is begin Set_Line (Get_Window, To); end Set_Line; function Col (Win : Window) return Positive_Count is Y : Line_Position; X : Column_Position; N : Natural; begin Get_Cursor_Position (Win, Y, X); N := Natural (X); N := N + 1; -- if N > Natural (Count'Last) then -- raise Layout_Error; -- end if; return Positive_Count (N); end Col; function Col return Positive_Count is begin return Col (Get_Window); end Col; function Line (Win : Window) return Positive_Count is Y : Line_Position; X : Column_Position; N : Natural; begin Get_Cursor_Position (Win, Y, X); N := Natural (Y); N := N + 1; -- if N > Natural (Count'Last) then -- raise Layout_Error; -- end if; return Positive_Count (N); end Line; function Line return Positive_Count is begin return Line (Get_Window); end Line; ----------------------- -- Characters Output -- ----------------------- procedure Put (Win : Window; Item : Character) is P_Size : constant Count := Page_Length (Win); Y : Line_Position; X : Column_Position; L : Line_Count; C : Column_Count; begin if P_Size > 0 then Get_Cursor_Position (Win, Y, X); Get_Size (Win, L, C); if (Y + 1) = L and then (X + 1) = C then New_Page (Win); end if; end if; Add (Win, Item); end Put; procedure Put (Item : Character) is begin Put (Get_Window, Item); end Put; -------------------- -- Strings-Output -- -------------------- procedure Put (Win : Window; Item : String) is P_Size : constant Count := Page_Length (Win); Y : Line_Position; X : Column_Position; L : Line_Count; C : Column_Count; begin if P_Size > 0 then Get_Cursor_Position (Win, Y, X); Get_Size (Win, L, C); if (Y + 1) = L and then (X + 1 + Item'Length) >= C then New_Page (Win); end if; end if; Add (Win, Item); end Put; procedure Put (Item : String) is begin Put (Get_Window, Item); end Put; procedure Put_Line (Win : Window; Item : String) is begin Put (Win, Item); New_Line (Win, 1); end Put_Line; procedure Put_Line (Item : String) is begin Put_Line (Get_Window, Item); end Put_Line; end Terminal_Interface.Curses.Text_IO;
reznikmm/matreshka
Ada
14,878
ads
------------------------------------------------------------------------------ -- -- -- 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$ ------------------------------------------------------------------------------ -- This file is generated, don't edit it. ------------------------------------------------------------------------------ package AMF.Internals.Tables.DG_Metamodel is pragma Preelaborate; function MM_DG_DG return AMF.Internals.CMOF_Element; function MC_DG_Close_Path return AMF.Internals.CMOF_Element; function MC_DG_Cubic_Curve_To return AMF.Internals.CMOF_Element; function MC_DG_Elliptical_Arc_To return AMF.Internals.CMOF_Element; function MC_DG_Gradient_Stop return AMF.Internals.CMOF_Element; function MC_DG_Line_To return AMF.Internals.CMOF_Element; function MC_DG_Matrix return AMF.Internals.CMOF_Element; function MC_DG_Move_To return AMF.Internals.CMOF_Element; function MC_DG_Path_Command return AMF.Internals.CMOF_Element; function MC_DG_Quadratic_Curve_To return AMF.Internals.CMOF_Element; function MC_DG_Rotate return AMF.Internals.CMOF_Element; function MC_DG_Scale return AMF.Internals.CMOF_Element; function MC_DG_Skew return AMF.Internals.CMOF_Element; function MC_DG_Transform return AMF.Internals.CMOF_Element; function MC_DG_Translate return AMF.Internals.CMOF_Element; function MP_DG_Cubic_Curve_To_End_Control return AMF.Internals.CMOF_Element; function MP_DG_Cubic_Curve_To_Point return AMF.Internals.CMOF_Element; function MP_DG_Cubic_Curve_To_Start_Control return AMF.Internals.CMOF_Element; function MP_DG_Elliptical_Arc_To_Is_Large_Arc return AMF.Internals.CMOF_Element; function MP_DG_Elliptical_Arc_To_Is_Sweep return AMF.Internals.CMOF_Element; function MP_DG_Elliptical_Arc_To_Point return AMF.Internals.CMOF_Element; function MP_DG_Elliptical_Arc_To_Radii return AMF.Internals.CMOF_Element; function MP_DG_Elliptical_Arc_To_Rotation return AMF.Internals.CMOF_Element; function MP_DG_Gradient_Stop_Color return AMF.Internals.CMOF_Element; function MP_DG_Gradient_Stop_Offset return AMF.Internals.CMOF_Element; function MP_DG_Gradient_Stop_Opacity return AMF.Internals.CMOF_Element; function MP_DG_Line_To_Point return AMF.Internals.CMOF_Element; function MP_DG_Matrix_A return AMF.Internals.CMOF_Element; function MP_DG_Matrix_B return AMF.Internals.CMOF_Element; function MP_DG_Matrix_C return AMF.Internals.CMOF_Element; function MP_DG_Matrix_D return AMF.Internals.CMOF_Element; function MP_DG_Matrix_E return AMF.Internals.CMOF_Element; function MP_DG_Matrix_F return AMF.Internals.CMOF_Element; function MP_DG_Move_To_Point return AMF.Internals.CMOF_Element; function MP_DG_Path_Command_Is_Relative return AMF.Internals.CMOF_Element; function MP_DG_Quadratic_Curve_To_Control return AMF.Internals.CMOF_Element; function MP_DG_Quadratic_Curve_To_Point return AMF.Internals.CMOF_Element; function MP_DG_Rotate_Angle return AMF.Internals.CMOF_Element; function MP_DG_Rotate_Center return AMF.Internals.CMOF_Element; function MP_DG_Scale_Factor_X return AMF.Internals.CMOF_Element; function MP_DG_Scale_Factor_Y return AMF.Internals.CMOF_Element; function MP_DG_Skew_Angle_X return AMF.Internals.CMOF_Element; function MP_DG_Skew_Angle_Y return AMF.Internals.CMOF_Element; function MP_DG_Translate_Delta_X return AMF.Internals.CMOF_Element; function MP_DG_Translate_Delta_Y return AMF.Internals.CMOF_Element; function MC_DG_Canvas return AMF.Internals.CMOF_Element; function MC_DG_Circle return AMF.Internals.CMOF_Element; function MC_DG_Clip_Path return AMF.Internals.CMOF_Element; function MC_DG_Ellipse return AMF.Internals.CMOF_Element; function MC_DG_Fill return AMF.Internals.CMOF_Element; function MC_DG_Gradient return AMF.Internals.CMOF_Element; function MC_DG_Graphical_Element return AMF.Internals.CMOF_Element; function MC_DG_Group return AMF.Internals.CMOF_Element; function MC_DG_Image return AMF.Internals.CMOF_Element; function MC_DG_Line return AMF.Internals.CMOF_Element; function MC_DG_Linear_Gradient return AMF.Internals.CMOF_Element; function MC_DG_Marked_Element return AMF.Internals.CMOF_Element; function MC_DG_Marker return AMF.Internals.CMOF_Element; function MC_DG_Path return AMF.Internals.CMOF_Element; function MC_DG_Pattern return AMF.Internals.CMOF_Element; function MC_DG_Polygon return AMF.Internals.CMOF_Element; function MC_DG_Polyline return AMF.Internals.CMOF_Element; function MC_DG_Radial_Gradient return AMF.Internals.CMOF_Element; function MC_DG_Rectangle return AMF.Internals.CMOF_Element; function MC_DG_Style return AMF.Internals.CMOF_Element; function MC_DG_Text return AMF.Internals.CMOF_Element; function MP_DG_Canvas_Background_Color return AMF.Internals.CMOF_Element; function MP_DG_Canvas_Background_Fill_A_Canvas return AMF.Internals.CMOF_Element; function MP_DG_Canvas_Packaged_Fill_Fill_Canvas return AMF.Internals.CMOF_Element; function MP_DG_Canvas_Packaged_Marker_Marker_Canvas return AMF.Internals.CMOF_Element; function MP_DG_Canvas_Packaged_Style_A_Canvas return AMF.Internals.CMOF_Element; function MP_DG_Circle_Center return AMF.Internals.CMOF_Element; function MP_DG_Circle_Radius return AMF.Internals.CMOF_Element; function MP_DG_Clip_Path_Clipped_Element_Graphical_Element_Clip_Path return AMF.Internals.CMOF_Element; function MP_DG_Ellipse_Center return AMF.Internals.CMOF_Element; function MP_DG_Ellipse_Radii return AMF.Internals.CMOF_Element; function MP_DG_Fill_Canvas_Canvas_Packaged_Fill return AMF.Internals.CMOF_Element; function MP_DG_Fill_Transform return AMF.Internals.CMOF_Element; function MP_DG_Gradient_Stop return AMF.Internals.CMOF_Element; function MP_DG_Graphical_Element_Clip_Path_Clip_Path_Clipped_Element return AMF.Internals.CMOF_Element; function MP_DG_Graphical_Element_Group_Group_Member return AMF.Internals.CMOF_Element; function MP_DG_Graphical_Element_Local_Style_A_Styled_Element return AMF.Internals.CMOF_Element; function MP_DG_Graphical_Element_Shared_Style_A_Styled_Element return AMF.Internals.CMOF_Element; function MP_DG_Graphical_Element_Transform return AMF.Internals.CMOF_Element; function MP_DG_Group_Member_Graphical_Element_Group return AMF.Internals.CMOF_Element; function MP_DG_Image_Bounds return AMF.Internals.CMOF_Element; function MP_DG_Image_Is_Aspect_Ratio_Preserved return AMF.Internals.CMOF_Element; function MP_DG_Image_Source return AMF.Internals.CMOF_Element; function MP_DG_Line_End return AMF.Internals.CMOF_Element; function MP_DG_Line_Start return AMF.Internals.CMOF_Element; function MP_DG_Linear_Gradient_X1 return AMF.Internals.CMOF_Element; function MP_DG_Linear_Gradient_X2 return AMF.Internals.CMOF_Element; function MP_DG_Linear_Gradient_Y1 return AMF.Internals.CMOF_Element; function MP_DG_Linear_Gradient_Y2 return AMF.Internals.CMOF_Element; function MP_DG_Marked_Element_End_Marker_A_Marked_Element return AMF.Internals.CMOF_Element; function MP_DG_Marked_Element_Mid_Marker_A_Marked_Element return AMF.Internals.CMOF_Element; function MP_DG_Marked_Element_Start_Marker_A_Marked_Element return AMF.Internals.CMOF_Element; function MP_DG_Marker_Canvas_Canvas_Packaged_Marker return AMF.Internals.CMOF_Element; function MP_DG_Marker_Reference return AMF.Internals.CMOF_Element; function MP_DG_Marker_Size return AMF.Internals.CMOF_Element; function MP_DG_Path_Command return AMF.Internals.CMOF_Element; function MP_DG_Pattern_Bounds return AMF.Internals.CMOF_Element; function MP_DG_Pattern_Tile_A_Pattern return AMF.Internals.CMOF_Element; function MP_DG_Polygon_Point return AMF.Internals.CMOF_Element; function MP_DG_Polyline_Point return AMF.Internals.CMOF_Element; function MP_DG_Radial_Gradient_Center_X return AMF.Internals.CMOF_Element; function MP_DG_Radial_Gradient_Center_Y return AMF.Internals.CMOF_Element; function MP_DG_Radial_Gradient_Focus_X return AMF.Internals.CMOF_Element; function MP_DG_Radial_Gradient_Focus_Y return AMF.Internals.CMOF_Element; function MP_DG_Radial_Gradient_Radius return AMF.Internals.CMOF_Element; function MP_DG_Rectangle_Bounds return AMF.Internals.CMOF_Element; function MP_DG_Rectangle_Corner_Radius return AMF.Internals.CMOF_Element; function MP_DG_Style_Fill_A_Style return AMF.Internals.CMOF_Element; function MP_DG_Style_Fill_Color return AMF.Internals.CMOF_Element; function MP_DG_Style_Fill_Opacity return AMF.Internals.CMOF_Element; function MP_DG_Style_Font_Bold return AMF.Internals.CMOF_Element; function MP_DG_Style_Font_Color return AMF.Internals.CMOF_Element; function MP_DG_Style_Font_Italic return AMF.Internals.CMOF_Element; function MP_DG_Style_Font_Name return AMF.Internals.CMOF_Element; function MP_DG_Style_Font_Size return AMF.Internals.CMOF_Element; function MP_DG_Style_Font_Strike_Through return AMF.Internals.CMOF_Element; function MP_DG_Style_Font_Underline return AMF.Internals.CMOF_Element; function MP_DG_Style_Stroke_Color return AMF.Internals.CMOF_Element; function MP_DG_Style_Stroke_Dash_Length return AMF.Internals.CMOF_Element; function MP_DG_Style_Stroke_Opacity return AMF.Internals.CMOF_Element; function MP_DG_Style_Stroke_Width return AMF.Internals.CMOF_Element; function MP_DG_Text_Alignment return AMF.Internals.CMOF_Element; function MP_DG_Text_Bounds return AMF.Internals.CMOF_Element; function MP_DG_Text_Data return AMF.Internals.CMOF_Element; function MP_DG_A_Pattern_Pattern_Tile return AMF.Internals.CMOF_Element; function MP_DG_A_Canvas_Canvas_Packaged_Style return AMF.Internals.CMOF_Element; function MP_DG_A_Marked_Element_Marked_Element_Start_Marker return AMF.Internals.CMOF_Element; function MP_DG_A_Marked_Element_Marked_Element_End_Marker return AMF.Internals.CMOF_Element; function MP_DG_A_Marked_Element_Marked_Element_Mid_Marker return AMF.Internals.CMOF_Element; function MP_DG_A_Styled_Element_Graphical_Element_Local_Style return AMF.Internals.CMOF_Element; function MP_DG_A_Style_Style_Fill return AMF.Internals.CMOF_Element; function MP_DG_A_Styled_Element_Graphical_Element_Shared_Style return AMF.Internals.CMOF_Element; function MP_DG_A_Canvas_Canvas_Background_Fill return AMF.Internals.CMOF_Element; function MA_DG_Pattern_Tile_Pattern return AMF.Internals.CMOF_Element; function MA_DG_Canvas_Packaged_Style_Canvas return AMF.Internals.CMOF_Element; function MA_DG_Marked_Element_Start_Marker_Marked_Element return AMF.Internals.CMOF_Element; function MA_DG_Marked_Element_End_Marker_Marked_Element return AMF.Internals.CMOF_Element; function MA_DG_Group_Member_Group return AMF.Internals.CMOF_Element; function MA_DG_Marked_Element_Mid_Marker_Marked_Element return AMF.Internals.CMOF_Element; function MA_DG_Canvas_Packaged_Marker_Canvas return AMF.Internals.CMOF_Element; function MA_DG_Graphical_Element_Clip_Path_Clipped_Element return AMF.Internals.CMOF_Element; function MA_DG_Graphical_Element_Local_Style_Styled_Element return AMF.Internals.CMOF_Element; function MA_DG_Canvas_Packaged_Fill_Canvas return AMF.Internals.CMOF_Element; function MA_DG_Style_Fill_Style return AMF.Internals.CMOF_Element; function MA_DG_Graphical_Element_Shared_Style_Styled_Element return AMF.Internals.CMOF_Element; function MA_DG_Canvas_Background_Fill_Canvas return AMF.Internals.CMOF_Element; function MB_DG return AMF.Internals.AMF_Element; function ML_DG return AMF.Internals.AMF_Element; private Base : AMF.Internals.CMOF_Element := 0; end AMF.Internals.Tables.DG_Metamodel;
nerilex/ada-util
Ada
4,646
ads
----------------------------------------------------------------------- -- Util.Streams.Files -- File Stream utilities -- Copyright (C) 2010, 2011, 2012, 2015, 2016 Stephane Carrez -- Written by Stephane Carrez ([email protected]) -- -- Licensed under the Apache License, Version 2.0 (the "License"); -- you may not use this file except in compliance with the License. -- You may obtain a copy of the License at -- -- http://www.apache.org/licenses/LICENSE-2.0 -- -- Unless required by applicable law or agreed to in writing, software -- distributed under the License is distributed on an "AS IS" BASIS, -- WITHOUT WARRANTIES OR CONDITIONS OF ANY KIND, either express or implied. -- See the License for the specific language governing permissions and -- limitations under the License. ----------------------------------------------------------------------- with Ada.Strings.Unbounded; with Util.Streams.Buffered; with Util.Texts.Transforms; with Ada.Characters.Handling; with Ada.Wide_Wide_Characters.Handling; with Ada.Calendar; with GNAT.Calendar.Time_IO; package Util.Streams.Texts is -- ----------------------- -- Print stream -- ----------------------- -- The <b>Print_Stream</b> is an output stream which provides helper methods -- for writing text streams. type Print_Stream is new Buffered.Buffered_Stream with private; type Print_Stream_Access is access all Print_Stream'Class; procedure Initialize (Stream : in out Print_Stream; To : in Output_Stream_Access); -- Write an integer on the stream. procedure Write (Stream : in out Print_Stream; Item : in Integer); -- Write an integer on the stream. procedure Write (Stream : in out Print_Stream; Item : in Long_Long_Integer); -- Write a string on the stream. procedure Write (Stream : in out Print_Stream; Item : in Ada.Strings.Unbounded.Unbounded_String); -- Write a date on the stream. procedure Write (Stream : in out Print_Stream; Item : in Ada.Calendar.Time; Format : in GNAT.Calendar.Time_IO.Picture_String := GNAT.Calendar.Time_IO.ISO_Date); -- Get the output stream content as a string. function To_String (Stream : in Buffered.Buffered_Stream) return String; -- Write a character on the stream. procedure Write_Char (Stream : in out Buffered.Buffered_Stream'Class; Item : in Character); -- Write a character on the stream. procedure Write_Char (Stream : in out Buffered.Buffered_Stream'Class; Item : in Wide_Wide_Character); package TR is new Util.Texts.Transforms (Stream => Buffered.Buffered_Stream'Class, Char => Character, Input => String, Put => Write_Char, To_Upper => Ada.Characters.Handling.To_Upper, To_Lower => Ada.Characters.Handling.To_Lower); package WTR is new Util.Texts.Transforms (Stream => Buffered.Buffered_Stream'Class, Char => Wide_Wide_Character, Input => Wide_Wide_String, Put => Write_Char, To_Upper => Ada.Wide_Wide_Characters.Handling.To_Upper, To_Lower => Ada.Wide_Wide_Characters.Handling.To_Lower); -- ----------------------- -- Reader stream -- ----------------------- -- The <b>Reader_Stream</b> is an input stream which provides helper methods -- for reading text streams. type Reader_Stream is new Buffered.Buffered_Stream with private; type Reader_Stream_Access is access all Reader_Stream'Class; -- Initialize the reader to read the input from the input stream given in <b>From</b>. procedure Initialize (Stream : in out Reader_Stream; From : in Input_Stream_Access); -- Read an input line from the input stream. The line is terminated by ASCII.LF. -- When <b>Strip</b> is set, the line terminators (ASCII.CR, ASCII.LF) are removed. procedure Read_Line (Stream : in out Reader_Stream; Into : out Ada.Strings.Unbounded.Unbounded_String; Strip : in Boolean := False); private type Print_Stream is new Buffered.Buffered_Stream with null record; type Reader_Stream is new Buffered.Buffered_Stream with null record; end Util.Streams.Texts;
reznikmm/matreshka
Ada
3,714
ads
------------------------------------------------------------------------------ -- -- -- Matreshka Project -- -- -- -- Open Document Toolkit -- -- -- -- Runtime Library Component -- -- -- ------------------------------------------------------------------------------ -- -- -- Copyright © 2014, Vadim Godunko <[email protected]> -- -- All rights reserved. -- -- -- -- Redistribution and use in source and binary forms, with or without -- -- modification, are permitted provided that the following conditions -- -- are met: -- -- -- -- * Redistributions of source code must retain the above copyright -- -- notice, this list of conditions and the following disclaimer. -- -- -- -- * Redistributions in binary form must reproduce the above copyright -- -- notice, this list of conditions and the following disclaimer in the -- -- documentation and/or other materials provided with the distribution. -- -- -- -- * Neither the name of the Vadim Godunko, IE nor the names of its -- -- contributors may be used to endorse or promote products derived from -- -- this software without specific prior written permission. -- -- -- -- THIS SOFTWARE IS PROVIDED BY THE COPYRIGHT HOLDERS AND CONTRIBUTORS -- -- "AS IS" AND ANY EXPRESS OR IMPLIED WARRANTIES, INCLUDING, BUT NOT -- -- LIMITED TO, THE IMPLIED WARRANTIES OF MERCHANTABILITY AND FITNESS FOR -- -- A PARTICULAR PURPOSE ARE DISCLAIMED. IN NO EVENT SHALL THE COPYRIGHT -- -- HOLDER OR CONTRIBUTORS BE LIABLE FOR ANY DIRECT, INDIRECT, INCIDENTAL, -- -- SPECIAL, EXEMPLARY, OR CONSEQUENTIAL DAMAGES (INCLUDING, BUT NOT LIMITED -- -- TO, PROCUREMENT OF SUBSTITUTE GOODS OR SERVICES; LOSS OF USE, DATA, OR -- -- PROFITS; OR BUSINESS INTERRUPTION) HOWEVER CAUSED AND ON ANY THEORY OF -- -- LIABILITY, WHETHER IN CONTRACT, STRICT LIABILITY, OR TORT (INCLUDING -- -- NEGLIGENCE OR OTHERWISE) ARISING IN ANY WAY OUT OF THE USE OF THIS -- -- SOFTWARE, EVEN IF ADVISED OF THE POSSIBILITY OF SUCH DAMAGE. -- -- -- ------------------------------------------------------------------------------ -- $Revision$ $Date$ ------------------------------------------------------------------------------ with XML.DOM.Attributes; package ODF.DOM.Draw_May_Script_Attributes is pragma Preelaborate; type ODF_Draw_May_Script_Attribute is limited interface and XML.DOM.Attributes.DOM_Attribute; type ODF_Draw_May_Script_Attribute_Access is access all ODF_Draw_May_Script_Attribute'Class with Storage_Size => 0; end ODF.DOM.Draw_May_Script_Attributes;
RREE/ada-util
Ada
8,605
ads
----------------------------------------------------------------------- -- util-serialize-io-json -- JSON Serialization Driver -- Copyright (C) 2010, 2011, 2012, 2016, 2017, 2020, 2021 Stephane Carrez -- Written by Stephane Carrez ([email protected]) -- -- Licensed under the Apache License, Version 2.0 (the "License"); -- you may not use this file except in compliance with the License. -- You may obtain a copy of the License at -- -- http://www.apache.org/licenses/LICENSE-2.0 -- -- Unless required by applicable law or agreed to in writing, software -- distributed under the License is distributed on an "AS IS" BASIS, -- WITHOUT WARRANTIES OR CONDITIONS OF ANY KIND, either express or implied. -- See the License for the specific language governing permissions and -- limitations under the License. ----------------------------------------------------------------------- with Ada.Strings.Unbounded; with Ada.Streams; with Util.Streams.Texts; with Util.Stacks; with Util.Beans.Objects; package Util.Serialize.IO.JSON is -- ------------------------------ -- JSON Output Stream -- ------------------------------ -- The <b>Output_Stream</b> provides methods for creating a JSON output stream. -- The stream object takes care of the JSON escape rules. type Output_Stream is limited new Util.Serialize.IO.Output_Stream with private; -- Set the target output stream. procedure Initialize (Stream : in out Output_Stream; Output : in Util.Streams.Texts.Print_Stream_Access); -- Flush the buffer (if any) to the sink. overriding procedure Flush (Stream : in out Output_Stream); -- Close the sink. overriding procedure Close (Stream : in out Output_Stream); -- Write the buffer array to the output stream. overriding procedure Write (Stream : in out Output_Stream; Buffer : in Ada.Streams.Stream_Element_Array); -- Write a wide character on the stream doing some conversion if necessary. -- The default implementation translates the wide character to a UTF-8 sequence. procedure Write_Wide (Stream : in out Output_Stream; Item : in Wide_Wide_Character); -- Start a JSON document. This operation writes the initial JSON marker ('{'). overriding procedure Start_Document (Stream : in out Output_Stream); -- Finish a JSON document by writing the final JSON marker ('}'). overriding procedure End_Document (Stream : in out Output_Stream); -- Write the value as a JSON string. Special characters are escaped using the JSON -- escape rules. procedure Write_String (Stream : in out Output_Stream; Value : in String); -- Write the value as a JSON string. Special characters are escaped using the JSON -- escape rules. procedure Write_Wide_String (Stream : in out Output_Stream; Value : in Wide_Wide_String); -- Start a new JSON object. If the name is not empty, write it as a string -- followed by the ':' (colon). The JSON object starts with '{' (curly brace). -- Example: "list": { procedure Start_Entity (Stream : in out Output_Stream; Name : in String); -- Terminates the current JSON object. procedure End_Entity (Stream : in out Output_Stream; Name : in String); -- Write the attribute name/value pair. overriding procedure Write_Attribute (Stream : in out Output_Stream; Name : in String; Value : in String); overriding procedure Write_Wide_Attribute (Stream : in out Output_Stream; Name : in String; Value : in Wide_Wide_String); overriding procedure Write_Attribute (Stream : in out Output_Stream; Name : in String; Value : in Integer); overriding procedure Write_Attribute (Stream : in out Output_Stream; Name : in String; Value : in Boolean); -- Write a JSON name/value pair. The value is written according to its type -- Example: "name": null -- "name": false -- "name": 12 -- "name": "value" procedure Write_Attribute (Stream : in out Output_Stream; Name : in String; Value : in Util.Beans.Objects.Object); -- Write the attribute with a null value. overriding procedure Write_Null_Attribute (Stream : in out Output_Stream; Name : in String); -- Write a JSON name/value pair (see Write_Attribute). procedure Write_Entity (Stream : in out Output_Stream; Name : in String; Value : in Util.Beans.Objects.Object); -- Write a JSON name/value pair (see Write_Attribute). overriding procedure Write_Entity (Stream : in out Output_Stream; Name : in String; Value : in String); overriding procedure Write_Wide_Entity (Stream : in out Output_Stream; Name : in String; Value : in Wide_Wide_String); overriding procedure Write_Entity (Stream : in out Output_Stream; Name : in String; Value : in Boolean); overriding procedure Write_Entity (Stream : in out Output_Stream; Name : in String; Value : in Integer); overriding procedure Write_Entity (Stream : in out Output_Stream; Name : in String; Value : in Ada.Calendar.Time); overriding procedure Write_Long_Entity (Stream : in out Output_Stream; Name : in String; Value : in Long_Long_Integer); overriding procedure Write_Enum_Entity (Stream : in out Output_Stream; Name : in String; Value : in String); -- Write an entity with a null value. overriding procedure Write_Null_Entity (Stream : in out Output_Stream; Name : in String); -- Starts a JSON array. -- Example: "list": [ overriding procedure Start_Array (Stream : in out Output_Stream; Name : in String); -- Terminates a JSON array. overriding procedure End_Array (Stream : in out Output_Stream; Name : in String); type Parser is new Serialize.IO.Parser with private; -- Parse the stream using the JSON parser. procedure Parse (Handler : in out Parser; Stream : in out Util.Streams.Buffered.Input_Buffer_Stream'Class; Sink : in out Reader'Class); -- Get the current location (file and line) to report an error message. function Get_Location (Handler : in Parser) return String; -- Read a JSON file and return an object. function Read (Path : in String) return Util.Beans.Objects.Object; private type Node_Info is record Is_Array : Boolean := False; Is_Root : Boolean := False; Has_Fields : Boolean := False; end record; type Node_Info_Access is access all Node_Info; package Node_Info_Stack is new Util.Stacks (Element_Type => Node_Info, Element_Type_Access => Node_Info_Access); type Output_Stream is limited new Util.Serialize.IO.Output_Stream with record Stack : Node_Info_Stack.Stack; Stream : Util.Streams.Texts.Print_Stream_Access; end record; procedure Write_Field_Name (Stream : in out Output_Stream; Name : in String); type Token_Type is (T_EOF, T_LEFT_BRACE, T_RIGHT_BRACE, T_LEFT_BRACKET, T_RIGHT_BRACKET, T_COLON, T_COMMA, T_TRUE, T_FALSE, T_STRING, T_FLOAT, T_NUMBER, T_BOOLEAN, T_UNKNOWN, T_NULL); type Parser is new Util.Serialize.IO.Parser with record Token : Ada.Strings.Unbounded.Unbounded_String; Pending_Token : Token_Type := T_EOF; Line_Number : Natural := 1; Has_Pending_Char : Boolean := False; Pending_Char : Character; end record; end Util.Serialize.IO.JSON;
DrenfongWong/tkm-rpc
Ada
1,509
adb
with Tkmrpc.Servers.Ike; with Tkmrpc.Results; with Tkmrpc.Request.Ike.Cc_Set_User_Certificate.Convert; with Tkmrpc.Response.Ike.Cc_Set_User_Certificate.Convert; package body Tkmrpc.Operation_Handlers.Ike.Cc_Set_User_Certificate is ------------------------------------------------------------------------- procedure Handle (Req : Request.Data_Type; Res : out Response.Data_Type) is Specific_Req : Request.Ike.Cc_Set_User_Certificate.Request_Type; Specific_Res : Response.Ike.Cc_Set_User_Certificate.Response_Type; begin Specific_Res := Response.Ike.Cc_Set_User_Certificate.Null_Response; Specific_Req := Request.Ike.Cc_Set_User_Certificate.Convert.From_Request (S => Req); if Specific_Req.Data.Cc_Id'Valid and Specific_Req.Data.Ri_Id'Valid and Specific_Req.Data.Autha_Id'Valid and Specific_Req.Data.Certificate.Size'Valid then Servers.Ike.Cc_Set_User_Certificate (Result => Specific_Res.Header.Result, Cc_Id => Specific_Req.Data.Cc_Id, Ri_Id => Specific_Req.Data.Ri_Id, Autha_Id => Specific_Req.Data.Autha_Id, Certificate => Specific_Req.Data.Certificate); Res := Response.Ike.Cc_Set_User_Certificate.Convert.To_Response (S => Specific_Res); else Res.Header.Result := Results.Invalid_Parameter; end if; end Handle; end Tkmrpc.Operation_Handlers.Ike.Cc_Set_User_Certificate;
francesco-bongiovanni/ewok-kernel
Ada
2,394
ads
-- -- Copyright 2018 The wookey project team <[email protected]> -- - Ryad Benadjila -- - Arnauld Michelizza -- - Mathieu Renard -- - Philippe Thierry -- - Philippe Trebuchet -- -- 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.unchecked_conversion; with ewok.tasks_shared; use ewok.tasks_shared; with soc.interrupts; with rings; package ewok.softirq with spark_mode => off is type t_state is (DONE, WAITING); type t_isr_parameters is record handler : system_address; interrupt : soc.interrupts.t_interrupt; posthook_status : unsigned_32; posthook_data : unsigned_32; end record; type t_isr_request is record caller_id : ewok.tasks_shared.t_task_id; state : t_state; params : t_isr_parameters; end record; type t_syscall_request is record caller_id : ewok.tasks_shared.t_task_id; state : t_state; end record; MAX_QUEUE_SIZE : constant := 20; package p_isr_requests is new rings (t_isr_request, MAX_QUEUE_SIZE); use p_isr_requests; isr_queue : p_isr_requests.ring; package p_syscall_requests is new rings (t_syscall_request, MAX_QUEUE_SIZE); use p_syscall_requests; syscall_queue : p_syscall_requests.ring; procedure init with convention => c, export => true, external_name => "softirq_init", global => null; procedure push_isr (task_id : in ewok.tasks_shared.t_task_id; params : in t_isr_parameters); procedure push_syscall (task_id : in ewok.tasks_shared.t_task_id); procedure syscall_handler (req : in t_syscall_request); procedure isr_handler (req : in t_isr_request); procedure main_task; private previous_isr_owner : t_task_id := ID_UNUSED; end ewok.softirq;
reznikmm/matreshka
Ada
15,691
adb
------------------------------------------------------------------------------ -- -- -- Matreshka Project -- -- -- -- Web Framework -- -- -- -- Tools Component -- -- -- ------------------------------------------------------------------------------ -- -- -- Copyright © 2015, 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_Sets; with Asis.Declarations; with Asis.Elements; with League.Strings.Hash; with Properties.Tools; package body Properties.Declarations.Defining_Names is package String_Maps is new Ada.Containers.Hashed_Sets (Element_Type => League.Strings.Universal_String, Hash => League.Strings.Hash, Equivalent_Elements => League.Strings."=", "=" => League.Strings."="); Reserved : String_Maps.Set; Map : constant array (Asis.Operator_Kinds range Asis.An_And_Operator .. Asis.A_Not_Operator) of League.Strings.Universal_String := (Asis.An_And_Operator => League.Strings.To_Universal_String ("_and"), Asis.An_Or_Operator => League.Strings.To_Universal_String ("_or"), Asis.An_Xor_Operator => League.Strings.To_Universal_String ("_xor"), Asis.An_Equal_Operator => League.Strings.To_Universal_String ("_eq"), Asis.A_Not_Equal_Operator => League.Strings.To_Universal_String ("_ne"), Asis.A_Less_Than_Operator => League.Strings.To_Universal_String ("_lt"), Asis.A_Less_Than_Or_Equal_Operator => League.Strings.To_Universal_String ("_le"), Asis.A_Greater_Than_Operator => League.Strings.To_Universal_String ("_gt"), Asis.A_Greater_Than_Or_Equal_Operator => League.Strings.To_Universal_String ("_ge"), Asis.A_Plus_Operator => League.Strings.To_Universal_String ("_plus"), Asis.A_Minus_Operator => League.Strings.To_Universal_String ("_minus"), Asis.A_Concatenate_Operator => League.Strings.To_Universal_String ("_join"), Asis.A_Unary_Plus_Operator => League.Strings.To_Universal_String ("_nop"), Asis.A_Unary_Minus_Operator => League.Strings.To_Universal_String ("_neg"), Asis.A_Multiply_Operator => League.Strings.To_Universal_String ("_mul"), Asis.A_Divide_Operator => League.Strings.To_Universal_String ("_div"), Asis.A_Mod_Operator => League.Strings.To_Universal_String ("_mod"), Asis.A_Rem_Operator => League.Strings.To_Universal_String ("_rem"), Asis.An_Exponentiate_Operator => League.Strings.To_Universal_String ("_power"), Asis.An_Abs_Operator => League.Strings.To_Universal_String ("_abs"), Asis.A_Not_Operator => League.Strings.To_Universal_String ("_not")); function Get_Name (Name : Asis.Defining_Name) return League.Strings.Universal_String; ---------- -- Code -- ---------- function Code (Engine : access Engines.Contexts.Context; Element : Asis.Defining_Name; Name : Engines.Text_Property) return League.Strings.Universal_String is function Is_This return Boolean; function Get_Suffix return League.Strings.Universal_String; function Prev_Subprogram_Count return Natural; function Is_Subprogram (Kind : Asis.Declaration_Kinds) return Boolean; Decl : constant Asis.Declaration := Properties.Tools.Enclosing_Declaration (Element); Kind : constant Asis.Declaration_Kinds := Asis.Elements.Declaration_Kind (Decl); Text : League.Strings.Universal_String := Get_Name (Element); ---------------- -- Get_Suffix -- ---------------- function Get_Suffix return League.Strings.Universal_String is Result : League.Strings.Universal_String; begin if Is_Subprogram (Kind) and then not Asis.Elements.Is_Nil (Asis.Elements.Enclosing_Element (Decl)) then declare Count : constant Natural := Prev_Subprogram_Count; Image : Wide_Wide_String := Natural'Wide_Wide_Image (Count); begin if Count > 0 then Image (1) := '$'; Result.Append (Image); return Result; end if; end; end if; if Reserved.Contains (Text) then Result.Append ("$"); end if; return Result; end Get_Suffix; ------------------- -- Is_Subprogram -- ------------------- function Is_Subprogram (Kind : Asis.Declaration_Kinds) return Boolean is begin return Kind in Asis.A_Procedure_Declaration | Asis.A_Procedure_Body_Declaration | Asis.An_Expression_Function_Declaration | Asis.A_Procedure_Renaming_Declaration | Asis.A_Procedure_Body_Stub | Asis.A_Procedure_Instantiation | Asis.A_Function_Declaration | Asis.A_Function_Body_Declaration | Asis.A_Function_Renaming_Declaration | Asis.A_Function_Body_Stub | Asis.A_Function_Instantiation; end Is_Subprogram; ------------- -- Is_This -- ------------- function Is_This return Boolean is use type Asis.Declaration_Kinds; Proc : Asis.Declaration; begin if Kind = Asis.A_Parameter_Specification then Proc := Asis.Elements.Enclosing_Element (Decl); if Engine.Boolean.Get_Property (Proc, Engines.Is_Dispatching) and then Asis.Elements.Is_Equal (Decl, Asis.Declarations.Parameter_Profile (Proc) (1)) then return True; end if; end if; return False; end Is_This; --------------------------- -- Prev_Subprogram_Count -- --------------------------- function Prev_Subprogram_Count return Natural is Parent : constant Asis.Declaration := Properties.Tools.Enclosing_Declaration (Decl); Kind : constant Asis.Declaration_Kinds := Asis.Elements.Declaration_Kind (Parent); begin case Kind is when Asis.A_Package_Declaration => declare use type Asis.Declaration_List; Result : Natural := 0; List : constant Asis.Declaration_List := Asis.Declarations.Visible_Part_Declarative_Items (Parent) & Asis.Declarations.Private_Part_Declarative_Items (Parent); begin for J in List'Range loop if Asis.Elements.Is_Equal (Decl, List (J)) then return Result; elsif Is_Subprogram (Asis.Elements.Declaration_Kind (List (J))) then declare use type League.Strings.Universal_String; Name : constant Asis.Defining_Name := Asis.Declarations.Names (List (J)) (1); Image : constant League.Strings.Universal_String := Get_Name (Name); begin if Image = Text then Result := Result + 1; end if; end; end if; end loop; return 0; end; when others => return 0; end case; end Prev_Subprogram_Count; Link_Name : constant Wide_String := Properties.Tools.Get_Aspect (Decl, "Link_Name"); Spec : constant Asis.Declaration := (if Is_Subprogram (Kind) then Asis.Declarations.Corresponding_Declaration (Decl) else Asis.Nil_Element); begin if Link_Name = "" then if Is_This then return League.Strings.To_Universal_String ("this"); elsif not Asis.Elements.Is_Nil (Spec) and then Kind not in Asis.A_Generic_Instantiation and then not Asis.Elements.Is_Equal (Decl, Spec) then -- If this is subprogram body, return name of its specification return Engine.Text.Get_Property (Asis.Declarations.Names (Spec) (1), Name); end if; Text.Append (Get_Suffix); else Text := League.Strings.From_UTF_16_Wide_String (Link_Name); end if; return Text; end Code; -------------- -- Get_Name -- -------------- function Get_Name (Name : Asis.Defining_Name) return League.Strings.Universal_String is begin case Asis.Elements.Defining_Name_Kind (Name) is when Asis.A_Defining_Operator_Symbol => return Map (Asis.Elements.Operator_Kind (Name)); when others => declare Image : constant Wide_String := Asis.Declarations.Defining_Name_Image (Name); Text : constant League.Strings.Universal_String := League.Strings.From_UTF_16_Wide_String (Image) .To_Lowercase; begin return Text; end; end case; end Get_Name; ----------------- -- Method_Name -- ----------------- function Method_Name (Engine : access Engines.Contexts.Context; Element : Asis.Defining_Name; Name : Engines.Text_Property) return League.Strings.Universal_String is pragma Unreferenced (Engine, Name); Decl : constant Asis.Declaration := Properties.Tools.Enclosing_Declaration (Element); Link_Name : constant Wide_String := Properties.Tools.Get_Aspect (Decl, "Link_Name"); Text : League.Strings.Universal_String := Get_Name (Element); begin if Link_Name /= "" then Text := League.Strings.From_UTF_16_Wide_String (Link_Name); end if; return Text; end Method_Name; begin Reserved.Insert (League.Strings.To_Universal_String ("break")); Reserved.Insert (League.Strings.To_Universal_String ("case")); Reserved.Insert (League.Strings.To_Universal_String ("class")); Reserved.Insert (League.Strings.To_Universal_String ("catch")); Reserved.Insert (League.Strings.To_Universal_String ("const")); Reserved.Insert (League.Strings.To_Universal_String ("continue")); Reserved.Insert (League.Strings.To_Universal_String ("debugger")); Reserved.Insert (League.Strings.To_Universal_String ("default")); Reserved.Insert (League.Strings.To_Universal_String ("delete")); Reserved.Insert (League.Strings.To_Universal_String ("do")); Reserved.Insert (League.Strings.To_Universal_String ("else")); Reserved.Insert (League.Strings.To_Universal_String ("export")); Reserved.Insert (League.Strings.To_Universal_String ("extends")); Reserved.Insert (League.Strings.To_Universal_String ("finally")); Reserved.Insert (League.Strings.To_Universal_String ("for")); Reserved.Insert (League.Strings.To_Universal_String ("function")); Reserved.Insert (League.Strings.To_Universal_String ("if")); Reserved.Insert (League.Strings.To_Universal_String ("import")); Reserved.Insert (League.Strings.To_Universal_String ("in")); Reserved.Insert (League.Strings.To_Universal_String ("instanceof")); Reserved.Insert (League.Strings.To_Universal_String ("let")); Reserved.Insert (League.Strings.To_Universal_String ("new")); Reserved.Insert (League.Strings.To_Universal_String ("return")); Reserved.Insert (League.Strings.To_Universal_String ("super")); Reserved.Insert (League.Strings.To_Universal_String ("switch")); Reserved.Insert (League.Strings.To_Universal_String ("this")); Reserved.Insert (League.Strings.To_Universal_String ("throw")); Reserved.Insert (League.Strings.To_Universal_String ("try")); Reserved.Insert (League.Strings.To_Universal_String ("typeof")); Reserved.Insert (League.Strings.To_Universal_String ("var")); Reserved.Insert (League.Strings.To_Universal_String ("void")); Reserved.Insert (League.Strings.To_Universal_String ("while")); Reserved.Insert (League.Strings.To_Universal_String ("with")); Reserved.Insert (League.Strings.To_Universal_String ("yield")); Reserved.Insert (League.Strings.To_Universal_String ("self")); end Properties.Declarations.Defining_Names;
AdaCore/training_material
Ada
1,754
ads
pragma Ada_2005; pragma Style_Checks (Off); with Interfaces.C; use Interfaces.C; package avx512vbmiintrin_h is -- Copyright (C) 2013-2017 Free Software Foundation, Inc. -- This file is part of GCC. -- GCC 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, or (at your option) -- any later version. -- GCC 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. -- 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/>. -- skipped func _mm512_mask_multishift_epi64_epi8 -- skipped func _mm512_maskz_multishift_epi64_epi8 -- skipped func _mm512_multishift_epi64_epi8 -- skipped func _mm512_permutexvar_epi8 -- skipped func _mm512_maskz_permutexvar_epi8 -- skipped func _mm512_mask_permutexvar_epi8 -- skipped func _mm512_permutex2var_epi8 -- idx -- skipped func _mm512_mask_permutex2var_epi8 -- idx -- skipped func _mm512_mask2_permutex2var_epi8 -- idx -- skipped func _mm512_maskz_permutex2var_epi8 -- idx end avx512vbmiintrin_h;
reznikmm/matreshka
Ada
4,639
adb
------------------------------------------------------------------------------ -- -- -- Matreshka Project -- -- -- -- Open Document Toolkit -- -- -- -- Runtime Library Component -- -- -- ------------------------------------------------------------------------------ -- -- -- Copyright © 2014, Vadim Godunko <[email protected]> -- -- All rights reserved. -- -- -- -- Redistribution and use in source and binary forms, with or without -- -- modification, are permitted provided that the following conditions -- -- are met: -- -- -- -- * Redistributions of source code must retain the above copyright -- -- notice, this list of conditions and the following disclaimer. -- -- -- -- * Redistributions in binary form must reproduce the above copyright -- -- notice, this list of conditions and the following disclaimer in the -- -- documentation and/or other materials provided with the distribution. -- -- -- -- * Neither the name of the Vadim Godunko, IE nor the names of its -- -- contributors may be used to endorse or promote products derived from -- -- this software without specific prior written permission. -- -- -- -- THIS SOFTWARE IS PROVIDED BY THE COPYRIGHT HOLDERS AND CONTRIBUTORS -- -- "AS IS" AND ANY EXPRESS OR IMPLIED WARRANTIES, INCLUDING, BUT NOT -- -- LIMITED TO, THE IMPLIED WARRANTIES OF MERCHANTABILITY AND FITNESS FOR -- -- A PARTICULAR PURPOSE ARE DISCLAIMED. IN NO EVENT SHALL THE COPYRIGHT -- -- HOLDER OR CONTRIBUTORS BE LIABLE FOR ANY DIRECT, INDIRECT, INCIDENTAL, -- -- SPECIAL, EXEMPLARY, OR CONSEQUENTIAL DAMAGES (INCLUDING, BUT NOT LIMITED -- -- TO, PROCUREMENT OF SUBSTITUTE GOODS OR SERVICES; LOSS OF USE, DATA, OR -- -- PROFITS; OR BUSINESS INTERRUPTION) HOWEVER CAUSED AND ON ANY THEORY OF -- -- LIABILITY, WHETHER IN CONTRACT, STRICT LIABILITY, OR TORT (INCLUDING -- -- NEGLIGENCE OR OTHERWISE) ARISING IN ANY WAY OUT OF THE USE OF THIS -- -- SOFTWARE, EVEN IF ADVISED OF THE POSSIBILITY OF SUCH DAMAGE. -- -- -- ------------------------------------------------------------------------------ -- $Revision$ $Date$ ------------------------------------------------------------------------------ with Matreshka.DOM_Documents; with Matreshka.ODF_String_Constants; with ODF.DOM.Iterators; with ODF.DOM.Visitors; package body Matreshka.ODF_Form.Default_Button_Attributes is ------------ -- Create -- ------------ overriding function Create (Parameters : not null access Matreshka.DOM_Attributes.Attribute_L2_Parameters) return Form_Default_Button_Attribute_Node is begin return Self : Form_Default_Button_Attribute_Node do Matreshka.ODF_Form.Constructors.Initialize (Self'Unchecked_Access, Parameters.Document, Matreshka.ODF_String_Constants.Form_Prefix); end return; end Create; -------------------- -- Get_Local_Name -- -------------------- overriding function Get_Local_Name (Self : not null access constant Form_Default_Button_Attribute_Node) return League.Strings.Universal_String is pragma Unreferenced (Self); begin return Matreshka.ODF_String_Constants.Default_Button_Attribute; end Get_Local_Name; begin Matreshka.DOM_Documents.Register_Attribute (Matreshka.ODF_String_Constants.Form_URI, Matreshka.ODF_String_Constants.Default_Button_Attribute, Form_Default_Button_Attribute_Node'Tag); end Matreshka.ODF_Form.Default_Button_Attributes;
Spohn/LegendOfZelba
Ada
5,598
adb
with NPC_PC; use NPC_PC; with ada.text_io; use ada.text_io; with ada.integer_text_io; use ada.integer_text_io; with ada.integer_text_io;use ada.integer_text_io; with w_gen; use w_gen; with Ada.Numerics.Discrete_Random; with enemy_bst; use enemy_bst; package body combat_package is ------------------------------- -- Name: Jon Spohn -- David Rogina -- Combat Package ------------------------------- Procedure Combat(Hero : in out HeroClass; Enemy : in out EnemyClass; ET : in out EnemyTree; Run : in out integer) is answer : character:='a'; --character input to attack difference : integer; --Random roll subtype roll is integer range 0..10; package random_roll is new ada.numerics.discrete_random(roll); use random_roll; your_roll:integer:=0; --Hero roll enemy_roll:roll:=0; --Enemy roll run_roll:roll:=0; --Roll to determine if you can run or not g:generator; --Random number generator file:file_type; --File variable variable begin SetEnemyArmor(GetHeroH(Hero) / 3, Enemy); SetEnemyStrength(getheroS(hero) / 2, Enemy); --Display Monster Screen w_gen.clr_scr; open(file,in_file,"Monster.txt"); draw_enemy(file); close(file); --Display starting health put("HERO HEALTH: "); put(GetHeroH(hero),0); put(" "); put("ENEMY HEALTH: "); put(GetEnemyH(enemy),0); new_line; --Loop while neither character is dead while (GetHeroH(hero) > 0 and GetEnemyH(enemy) > 0) loop put_line("Would you like to:"); put_line("(a)ttack"); put_line("(r)un"); put(": "); get(answer); new_line; if (answer = 'a') then reset(g); your_roll:=random(g)+1; enemy_roll:=random(g); --Enemy won roll if (enemy_roll>your_roll) then setherohealth(enemy_roll,hero); --Hero won roll elsif(enemy_roll<your_roll) then setenemyhealth(your_roll,enemy); end if; --Display combat menu put_line("------------------------------------------"); put_line("---------------!!!COMBAT!!!---------------"); put_line("------------------------------------------"); put_line("-----HEALTH---------------------ROLLS-----"); put_line("-- --------------- --"); put("-- HERO: "); put(GetHeroH(hero),0); if((getheroh(hero)<100)and(getheroh(hero)>=10)) then put(" --------------- HERO: "); elsif((getheroh(hero)>=100)) then put(" --------------- HERO: "); else put(" -------------- HERO: "); end if; put(your_roll,0); if(your_roll<10) then put_line(" --"); else put_line(" --"); end if; put_line("-- --------------- --"); put_line("-- --------------- --"); put("-- ENEMY: "); put(getenemyh(enemy),0); if((getenemyh(enemy)<100)and(getenemyh(enemy)>=10) )then put(" --------------- ENEMY: "); elsif((getenemyh(enemy)>=100)) then put(" --------------- ENEMY: "); else put(" --------------- ENEMY: "); end if; put(enemy_roll,0); if(enemy_roll<10) then put_line(" --"); else put_line(" --"); end if; put_line("-- --------------- --"); put_line("------------------------------------------"); if (enemy_roll>your_roll) then put_line("------------ ENEMY WON ROLL ------------"); put_line("------------------------------------------"); elsif(enemy_roll<your_roll) then put_line("------------ HERO WON ROLL ------------"); put_line("------------------------------------------"); else put_line("------- ROLLS TIED: NO-ONE DAMAGED -------"); put_line("------------------------------------------"); end if; --Run if hero can roll an even number elsif(answer = 'r') then reset(g); run_roll:=random(g); if run_roll rem 2 >0 then put("You could not run!!"); new_line; else put_line("You ran away successfully!!!"); put("Enter any key to continue... "); run := 1; get(answer); exit; end if; end if; end loop; --Hero wins combat if(GetEnemyH(Enemy) <= 0) then Delete(ET,Enemy); put_line("You win! You feel a bit stronger!"); difference := (100 - GetHeroH(hero)) * (-1); SetHeroHealth(difference,hero); SetHeroArmor(3,hero); SetHeroStrength(4,hero); put("Enter any key to continue: "); get(answer); --Enemy wins combat elsif (getheroh(hero) <= 0) then put_line("You Have been SLAIN!!!"); put_line("Thank you for playing The Legend of Zelba"); put("Enter any key to quit: "); get(answer); end if; -- end if; end Combat; --Draw Monster Screen procedure draw_enemy(file:in file_type) is char:character; begin while not end_of_file(file) loop while not end_of_line(file) loop get(file, char); put(char); end loop; if not End_Of_File (file) then Skip_Line (file); new_line; end if; end loop; new_line; end draw_enemy; end combat_package;
JeremyGrosser/Ada_Drivers_Library
Ada
1,929
ads
-- This package was generated by the Ada_Drivers_Library project wizard script package ADL_Config is Architecture : constant String := "ARM"; -- From board definition Board : constant String := "Crazyflie"; -- From command line CPU_Core : constant String := "ARM Cortex-M4F"; -- From mcu definition Device_Family : constant String := "STM32F4"; -- From board definition Device_Name : constant String := "STM32F405RGTx"; -- From board definition Has_Ravenscar_Full_Runtime : constant String := "True"; -- From board definition Has_Ravenscar_SFP_Runtime : constant String := "True"; -- From board definition Has_ZFP_Runtime : constant String := "False"; -- From board definition High_Speed_External_Clock : constant := 8000000; -- From board definition Max_Mount_Name_Length : constant := 128; -- From default value Max_Mount_Points : constant := 2; -- From default value Max_Path_Length : constant := 1024; -- From default value Number_Of_Interrupts : constant := 0; -- From default value Runtime_Name : constant String := "ravenscar-sfp-stm32f4"; -- From default value Runtime_Name_Suffix : constant String := "stm32f4"; -- From board definition Runtime_Profile : constant String := "ravenscar-sfp"; -- From command line Use_Startup_Gen : constant Boolean := False; -- From command line Vendor : constant String := "STMicro"; -- From board definition end ADL_Config;
tum-ei-rcs/StratoX
Ada
80,200
ads
-- This spec has been automatically generated from STM32F427x.svd pragma Restrictions (No_Elaboration_Code); pragma Ada_2012; with System; with HAL; package STM32_SVD.TIM is pragma Preelaborate; --------------- -- Registers -- --------------- ------------------ -- CR1_Register -- ------------------ subtype CR1_CMS_Field is HAL.UInt2; subtype CR1_CKD_Field is HAL.UInt2; -- control register 1 type CR1_Register is record -- Counter enable CEN : Boolean := False; -- Update disable UDIS : Boolean := False; -- Update request source URS : Boolean := False; -- One-pulse mode OPM : Boolean := False; -- Direction DIR : Boolean := False; -- Center-aligned mode selection CMS : CR1_CMS_Field := 16#0#; -- Auto-reload preload enable ARPE : Boolean := False; -- Clock division CKD : CR1_CKD_Field := 16#0#; -- unspecified Reserved_10_31 : HAL.UInt22 := 16#0#; end record with Volatile_Full_Access, Size => 32, Bit_Order => System.Low_Order_First; for CR1_Register use record CEN at 0 range 0 .. 0; UDIS at 0 range 1 .. 1; URS at 0 range 2 .. 2; OPM at 0 range 3 .. 3; DIR at 0 range 4 .. 4; CMS at 0 range 5 .. 6; ARPE at 0 range 7 .. 7; CKD at 0 range 8 .. 9; Reserved_10_31 at 0 range 10 .. 31; end record; ------------------ -- CR2_Register -- ------------------ subtype CR2_MMS_Field is HAL.UInt3; -- control register 2 type CR2_Register is record -- Capture/compare preloaded control CCPC : Boolean := False; -- unspecified Reserved_1_1 : HAL.Bit := 16#0#; -- Capture/compare control update selection CCUS : Boolean := False; -- Capture/compare DMA selection CCDS : Boolean := False; -- Master mode selection MMS : CR2_MMS_Field := 16#0#; -- TI1 selection TI1S : Boolean := False; -- Output Idle state 1 OIS1 : Boolean := False; -- Output Idle state 1 OIS1N : Boolean := False; -- Output Idle state 2 OIS2 : Boolean := False; -- Output Idle state 2 OIS2N : Boolean := False; -- Output Idle state 3 OIS3 : Boolean := False; -- Output Idle state 3 OIS3N : Boolean := False; -- Output Idle state 4 OIS4 : Boolean := False; -- unspecified Reserved_15_31 : HAL.UInt17 := 16#0#; end record with Volatile_Full_Access, Size => 32, Bit_Order => System.Low_Order_First; for CR2_Register use record CCPC at 0 range 0 .. 0; Reserved_1_1 at 0 range 1 .. 1; CCUS at 0 range 2 .. 2; CCDS at 0 range 3 .. 3; MMS at 0 range 4 .. 6; TI1S at 0 range 7 .. 7; OIS1 at 0 range 8 .. 8; OIS1N at 0 range 9 .. 9; OIS2 at 0 range 10 .. 10; OIS2N at 0 range 11 .. 11; OIS3 at 0 range 12 .. 12; OIS3N at 0 range 13 .. 13; OIS4 at 0 range 14 .. 14; Reserved_15_31 at 0 range 15 .. 31; end record; ------------------- -- SMCR_Register -- ------------------- subtype SMCR_SMS_Field is HAL.UInt3; subtype SMCR_TS_Field is HAL.UInt3; subtype SMCR_ETF_Field is HAL.UInt4; subtype SMCR_ETPS_Field is HAL.UInt2; -- slave mode control register type SMCR_Register is record -- Slave mode selection SMS : SMCR_SMS_Field := 16#0#; -- unspecified Reserved_3_3 : HAL.Bit := 16#0#; -- Trigger selection TS : SMCR_TS_Field := 16#0#; -- Master/Slave mode MSM : Boolean := False; -- External trigger filter ETF : SMCR_ETF_Field := 16#0#; -- External trigger prescaler ETPS : SMCR_ETPS_Field := 16#0#; -- External clock enable ECE : Boolean := False; -- External trigger polarity ETP : Boolean := False; -- unspecified Reserved_16_31 : HAL.Short := 16#0#; end record with Volatile_Full_Access, Size => 32, Bit_Order => System.Low_Order_First; for SMCR_Register use record SMS at 0 range 0 .. 2; Reserved_3_3 at 0 range 3 .. 3; TS at 0 range 4 .. 6; MSM at 0 range 7 .. 7; ETF at 0 range 8 .. 11; ETPS at 0 range 12 .. 13; ECE at 0 range 14 .. 14; ETP at 0 range 15 .. 15; Reserved_16_31 at 0 range 16 .. 31; end record; ------------------- -- DIER_Register -- ------------------- -- DMA/Interrupt enable register type DIER_Register is record -- Update interrupt enable UIE : Boolean := False; -- Capture/Compare 1 interrupt enable CC1IE : Boolean := False; -- Capture/Compare 2 interrupt enable CC2IE : Boolean := False; -- Capture/Compare 3 interrupt enable CC3IE : Boolean := False; -- Capture/Compare 4 interrupt enable CC4IE : Boolean := False; -- COM interrupt enable COMIE : Boolean := False; -- Trigger interrupt enable TIE : Boolean := False; -- Break interrupt enable BIE : Boolean := False; -- Update DMA request enable UDE : Boolean := False; -- Capture/Compare 1 DMA request enable CC1DE : Boolean := False; -- Capture/Compare 2 DMA request enable CC2DE : Boolean := False; -- Capture/Compare 3 DMA request enable CC3DE : Boolean := False; -- Capture/Compare 4 DMA request enable CC4DE : Boolean := False; -- COM DMA request enable COMDE : Boolean := False; -- Trigger DMA request enable TDE : Boolean := False; -- unspecified Reserved_15_31 : HAL.UInt17 := 16#0#; end record with Volatile_Full_Access, Size => 32, Bit_Order => System.Low_Order_First; for DIER_Register use record UIE at 0 range 0 .. 0; CC1IE at 0 range 1 .. 1; CC2IE at 0 range 2 .. 2; CC3IE at 0 range 3 .. 3; CC4IE at 0 range 4 .. 4; COMIE at 0 range 5 .. 5; TIE at 0 range 6 .. 6; BIE at 0 range 7 .. 7; UDE at 0 range 8 .. 8; CC1DE at 0 range 9 .. 9; CC2DE at 0 range 10 .. 10; CC3DE at 0 range 11 .. 11; CC4DE at 0 range 12 .. 12; COMDE at 0 range 13 .. 13; TDE at 0 range 14 .. 14; Reserved_15_31 at 0 range 15 .. 31; end record; ----------------- -- SR_Register -- ----------------- -- status register type SR_Register is record -- Update interrupt flag UIF : Boolean := False; -- Capture/compare 1 interrupt flag CC1IF : Boolean := False; -- Capture/Compare 2 interrupt flag CC2IF : Boolean := False; -- Capture/Compare 3 interrupt flag CC3IF : Boolean := False; -- Capture/Compare 4 interrupt flag CC4IF : Boolean := False; -- COM interrupt flag COMIF : Boolean := False; -- Trigger interrupt flag TIF : Boolean := False; -- Break interrupt flag BIF : Boolean := False; -- unspecified Reserved_8_8 : HAL.Bit := 16#0#; -- Capture/Compare 1 overcapture flag CC1OF : Boolean := False; -- Capture/compare 2 overcapture flag CC2OF : Boolean := False; -- Capture/Compare 3 overcapture flag CC3OF : Boolean := False; -- Capture/Compare 4 overcapture flag CC4OF : Boolean := False; -- unspecified Reserved_13_31 : HAL.UInt19 := 16#0#; end record with Volatile_Full_Access, Size => 32, Bit_Order => System.Low_Order_First; for SR_Register use record UIF at 0 range 0 .. 0; CC1IF at 0 range 1 .. 1; CC2IF at 0 range 2 .. 2; CC3IF at 0 range 3 .. 3; CC4IF at 0 range 4 .. 4; COMIF at 0 range 5 .. 5; TIF at 0 range 6 .. 6; BIF at 0 range 7 .. 7; Reserved_8_8 at 0 range 8 .. 8; CC1OF at 0 range 9 .. 9; CC2OF at 0 range 10 .. 10; CC3OF at 0 range 11 .. 11; CC4OF at 0 range 12 .. 12; Reserved_13_31 at 0 range 13 .. 31; end record; ------------------ -- EGR_Register -- ------------------ -- event generation register type EGR_Register is record -- Write-only. Update generation UG : Boolean := False; -- Write-only. Capture/compare 1 generation CC1G : Boolean := False; -- Write-only. Capture/compare 2 generation CC2G : Boolean := False; -- Write-only. Capture/compare 3 generation CC3G : Boolean := False; -- Write-only. Capture/compare 4 generation CC4G : Boolean := False; -- Write-only. Capture/Compare control update generation COMG : Boolean := False; -- Write-only. Trigger generation TG : Boolean := False; -- Write-only. Break generation BG : Boolean := False; -- unspecified Reserved_8_31 : HAL.UInt24 := 16#0#; end record with Volatile_Full_Access, Size => 32, Bit_Order => System.Low_Order_First; for EGR_Register use record UG at 0 range 0 .. 0; CC1G at 0 range 1 .. 1; CC2G at 0 range 2 .. 2; CC3G at 0 range 3 .. 3; CC4G at 0 range 4 .. 4; COMG at 0 range 5 .. 5; TG at 0 range 6 .. 6; BG at 0 range 7 .. 7; Reserved_8_31 at 0 range 8 .. 31; end record; --------------------------- -- CCMR1_Output_Register -- --------------------------- subtype CCMR1_Output_CC1S_Field is HAL.UInt2; subtype CCMR1_Output_OC1M_Field is HAL.UInt3; subtype CCMR1_Output_CC2S_Field is HAL.UInt2; subtype CCMR1_Output_OC2M_Field is HAL.UInt3; -- capture/compare mode register 1 (output mode) type CCMR1_Output_Register is record -- Capture/Compare 1 selection CC1S : CCMR1_Output_CC1S_Field := 16#0#; -- Output Compare 1 fast enable OC1FE : Boolean := False; -- Output Compare 1 preload enable OC1PE : Boolean := False; -- Output Compare 1 mode OC1M : CCMR1_Output_OC1M_Field := 16#0#; -- Output Compare 1 clear enable OC1CE : Boolean := False; -- Capture/Compare 2 selection CC2S : CCMR1_Output_CC2S_Field := 16#0#; -- Output Compare 2 fast enable OC2FE : Boolean := False; -- Output Compare 2 preload enable OC2PE : Boolean := False; -- Output Compare 2 mode OC2M : CCMR1_Output_OC2M_Field := 16#0#; -- Output Compare 2 clear enable OC2CE : Boolean := False; -- unspecified Reserved_16_31 : HAL.Short := 16#0#; end record with Volatile_Full_Access, Size => 32, Bit_Order => System.Low_Order_First; for CCMR1_Output_Register use record CC1S at 0 range 0 .. 1; OC1FE at 0 range 2 .. 2; OC1PE at 0 range 3 .. 3; OC1M at 0 range 4 .. 6; OC1CE at 0 range 7 .. 7; CC2S at 0 range 8 .. 9; OC2FE at 0 range 10 .. 10; OC2PE at 0 range 11 .. 11; OC2M at 0 range 12 .. 14; OC2CE at 0 range 15 .. 15; Reserved_16_31 at 0 range 16 .. 31; end record; -------------------------- -- CCMR1_Input_Register -- -------------------------- subtype CCMR1_Input_CC1S_Field is HAL.UInt2; subtype CCMR1_Input_ICPCS_Field is HAL.UInt2; subtype CCMR1_Input_IC1F_Field is HAL.UInt4; subtype CCMR1_Input_CC2S_Field is HAL.UInt2; subtype CCMR1_Input_IC2PCS_Field is HAL.UInt2; subtype CCMR1_Input_IC2F_Field is HAL.UInt4; -- capture/compare mode register 1 (input mode) type CCMR1_Input_Register is record -- Capture/Compare 1 selection CC1S : CCMR1_Input_CC1S_Field := 16#0#; -- Input capture 1 prescaler ICPCS : CCMR1_Input_ICPCS_Field := 16#0#; -- Input capture 1 filter IC1F : CCMR1_Input_IC1F_Field := 16#0#; -- Capture/Compare 2 selection CC2S : CCMR1_Input_CC2S_Field := 16#0#; -- Input capture 2 prescaler IC2PCS : CCMR1_Input_IC2PCS_Field := 16#0#; -- Input capture 2 filter IC2F : CCMR1_Input_IC2F_Field := 16#0#; -- unspecified Reserved_16_31 : HAL.Short := 16#0#; end record with Volatile_Full_Access, Size => 32, Bit_Order => System.Low_Order_First; for CCMR1_Input_Register use record CC1S at 0 range 0 .. 1; ICPCS at 0 range 2 .. 3; IC1F at 0 range 4 .. 7; CC2S at 0 range 8 .. 9; IC2PCS at 0 range 10 .. 11; IC2F at 0 range 12 .. 15; Reserved_16_31 at 0 range 16 .. 31; end record; --------------------------- -- CCMR2_Output_Register -- --------------------------- subtype CCMR2_Output_CC3S_Field is HAL.UInt2; subtype CCMR2_Output_OC3M_Field is HAL.UInt3; subtype CCMR2_Output_CC4S_Field is HAL.UInt2; subtype CCMR2_Output_OC4M_Field is HAL.UInt3; -- capture/compare mode register 2 (output mode) type CCMR2_Output_Register is record -- Capture/Compare 3 selection CC3S : CCMR2_Output_CC3S_Field := 16#0#; -- Output compare 3 fast enable OC3FE : Boolean := False; -- Output compare 3 preload enable OC3PE : Boolean := False; -- Output compare 3 mode OC3M : CCMR2_Output_OC3M_Field := 16#0#; -- Output compare 3 clear enable OC3CE : Boolean := False; -- Capture/Compare 4 selection CC4S : CCMR2_Output_CC4S_Field := 16#0#; -- Output compare 4 fast enable OC4FE : Boolean := False; -- Output compare 4 preload enable OC4PE : Boolean := False; -- Output compare 4 mode OC4M : CCMR2_Output_OC4M_Field := 16#0#; -- Output compare 4 clear enable OC4CE : Boolean := False; -- unspecified Reserved_16_31 : HAL.Short := 16#0#; end record with Volatile_Full_Access, Size => 32, Bit_Order => System.Low_Order_First; for CCMR2_Output_Register use record CC3S at 0 range 0 .. 1; OC3FE at 0 range 2 .. 2; OC3PE at 0 range 3 .. 3; OC3M at 0 range 4 .. 6; OC3CE at 0 range 7 .. 7; CC4S at 0 range 8 .. 9; OC4FE at 0 range 10 .. 10; OC4PE at 0 range 11 .. 11; OC4M at 0 range 12 .. 14; OC4CE at 0 range 15 .. 15; Reserved_16_31 at 0 range 16 .. 31; end record; -------------------------- -- CCMR2_Input_Register -- -------------------------- subtype CCMR2_Input_CC3S_Field is HAL.UInt2; subtype CCMR2_Input_IC3PSC_Field is HAL.UInt2; subtype CCMR2_Input_IC3F_Field is HAL.UInt4; subtype CCMR2_Input_CC4S_Field is HAL.UInt2; subtype CCMR2_Input_IC4PSC_Field is HAL.UInt2; subtype CCMR2_Input_IC4F_Field is HAL.UInt4; -- capture/compare mode register 2 (input mode) type CCMR2_Input_Register is record -- Capture/compare 3 selection CC3S : CCMR2_Input_CC3S_Field := 16#0#; -- Input capture 3 prescaler IC3PSC : CCMR2_Input_IC3PSC_Field := 16#0#; -- Input capture 3 filter IC3F : CCMR2_Input_IC3F_Field := 16#0#; -- Capture/Compare 4 selection CC4S : CCMR2_Input_CC4S_Field := 16#0#; -- Input capture 4 prescaler IC4PSC : CCMR2_Input_IC4PSC_Field := 16#0#; -- Input capture 4 filter IC4F : CCMR2_Input_IC4F_Field := 16#0#; -- unspecified Reserved_16_31 : HAL.Short := 16#0#; end record with Volatile_Full_Access, Size => 32, Bit_Order => System.Low_Order_First; for CCMR2_Input_Register use record CC3S at 0 range 0 .. 1; IC3PSC at 0 range 2 .. 3; IC3F at 0 range 4 .. 7; CC4S at 0 range 8 .. 9; IC4PSC at 0 range 10 .. 11; IC4F at 0 range 12 .. 15; Reserved_16_31 at 0 range 16 .. 31; end record; ------------------- -- CCER_Register -- ------------------- -- capture/compare enable register type CCER_Register is record -- Capture/Compare 1 output enable CC1E : Boolean := False; -- Capture/Compare 1 output Polarity CC1P : Boolean := False; -- Capture/Compare 1 complementary output enable CC1NE : Boolean := False; -- Capture/Compare 1 output Polarity CC1NP : Boolean := False; -- Capture/Compare 2 output enable CC2E : Boolean := False; -- Capture/Compare 2 output Polarity CC2P : Boolean := False; -- Capture/Compare 2 complementary output enable CC2NE : Boolean := False; -- Capture/Compare 2 output Polarity CC2NP : Boolean := False; -- Capture/Compare 3 output enable CC3E : Boolean := False; -- Capture/Compare 3 output Polarity CC3P : Boolean := False; -- Capture/Compare 3 complementary output enable CC3NE : Boolean := False; -- Capture/Compare 3 output Polarity CC3NP : Boolean := False; -- Capture/Compare 4 output enable CC4E : Boolean := False; -- Capture/Compare 3 output Polarity CC4P : Boolean := False; -- unspecified Reserved_14_31 : HAL.UInt18 := 16#0#; end record with Volatile_Full_Access, Size => 32, Bit_Order => System.Low_Order_First; for CCER_Register use record CC1E at 0 range 0 .. 0; CC1P at 0 range 1 .. 1; CC1NE at 0 range 2 .. 2; CC1NP at 0 range 3 .. 3; CC2E at 0 range 4 .. 4; CC2P at 0 range 5 .. 5; CC2NE at 0 range 6 .. 6; CC2NP at 0 range 7 .. 7; CC3E at 0 range 8 .. 8; CC3P at 0 range 9 .. 9; CC3NE at 0 range 10 .. 10; CC3NP at 0 range 11 .. 11; CC4E at 0 range 12 .. 12; CC4P at 0 range 13 .. 13; Reserved_14_31 at 0 range 14 .. 31; end record; ------------------ -- CNT_Register -- ------------------ subtype CNT_CNT_Field is HAL.Short; -- counter type CNT_Register is record -- counter value CNT : CNT_CNT_Field := 16#0#; -- unspecified Reserved_16_31 : HAL.Short := 16#0#; end record with Volatile_Full_Access, Size => 32, Bit_Order => System.Low_Order_First; for CNT_Register use record CNT at 0 range 0 .. 15; Reserved_16_31 at 0 range 16 .. 31; end record; ------------------ -- PSC_Register -- ------------------ subtype PSC_PSC_Field is HAL.Short; -- prescaler type PSC_Register is record -- Prescaler value PSC : PSC_PSC_Field := 16#0#; -- unspecified Reserved_16_31 : HAL.Short := 16#0#; end record with Volatile_Full_Access, Size => 32, Bit_Order => System.Low_Order_First; for PSC_Register use record PSC at 0 range 0 .. 15; Reserved_16_31 at 0 range 16 .. 31; end record; ------------------ -- ARR_Register -- ------------------ subtype ARR_ARR_Field is HAL.Short; -- auto-reload register type ARR_Register is record -- Auto-reload value ARR : ARR_ARR_Field := 16#0#; -- unspecified Reserved_16_31 : HAL.Short := 16#0#; end record with Volatile_Full_Access, Size => 32, Bit_Order => System.Low_Order_First; for ARR_Register use record ARR at 0 range 0 .. 15; Reserved_16_31 at 0 range 16 .. 31; end record; ------------------ -- RCR_Register -- ------------------ subtype RCR_REP_Field is HAL.Byte; -- repetition counter register type RCR_Register is record -- Repetition counter value REP : RCR_REP_Field := 16#0#; -- unspecified Reserved_8_31 : HAL.UInt24 := 16#0#; end record with Volatile_Full_Access, Size => 32, Bit_Order => System.Low_Order_First; for RCR_Register use record REP at 0 range 0 .. 7; Reserved_8_31 at 0 range 8 .. 31; end record; ------------------- -- CCR1_Register -- ------------------- subtype CCR1_CCR1_Field is HAL.Short; -- capture/compare register 1 type CCR1_Register is record -- Capture/Compare 1 value CCR1 : CCR1_CCR1_Field := 16#0#; -- unspecified Reserved_16_31 : HAL.Short := 16#0#; end record with Volatile_Full_Access, Size => 32, Bit_Order => System.Low_Order_First; for CCR1_Register use record CCR1 at 0 range 0 .. 15; Reserved_16_31 at 0 range 16 .. 31; end record; ------------------- -- CCR2_Register -- ------------------- subtype CCR2_CCR2_Field is HAL.Short; -- capture/compare register 2 type CCR2_Register is record -- Capture/Compare 2 value CCR2 : CCR2_CCR2_Field := 16#0#; -- unspecified Reserved_16_31 : HAL.Short := 16#0#; end record with Volatile_Full_Access, Size => 32, Bit_Order => System.Low_Order_First; for CCR2_Register use record CCR2 at 0 range 0 .. 15; Reserved_16_31 at 0 range 16 .. 31; end record; ------------------- -- CCR3_Register -- ------------------- subtype CCR3_CCR3_Field is HAL.Short; -- capture/compare register 3 type CCR3_Register is record -- Capture/Compare value CCR3 : CCR3_CCR3_Field := 16#0#; -- unspecified Reserved_16_31 : HAL.Short := 16#0#; end record with Volatile_Full_Access, Size => 32, Bit_Order => System.Low_Order_First; for CCR3_Register use record CCR3 at 0 range 0 .. 15; Reserved_16_31 at 0 range 16 .. 31; end record; ------------------- -- CCR4_Register -- ------------------- subtype CCR4_CCR4_Field is HAL.Short; -- capture/compare register 4 type CCR4_Register is record -- Capture/Compare value CCR4 : CCR4_CCR4_Field := 16#0#; -- unspecified Reserved_16_31 : HAL.Short := 16#0#; end record with Volatile_Full_Access, Size => 32, Bit_Order => System.Low_Order_First; for CCR4_Register use record CCR4 at 0 range 0 .. 15; Reserved_16_31 at 0 range 16 .. 31; end record; ------------------- -- BDTR_Register -- ------------------- subtype BDTR_DTG_Field is HAL.Byte; subtype BDTR_LOCK_Field is HAL.UInt2; -- break and dead-time register type BDTR_Register is record -- Dead-time generator setup DTG : BDTR_DTG_Field := 16#0#; -- Lock configuration LOCK : BDTR_LOCK_Field := 16#0#; -- Off-state selection for Idle mode OSSI : Boolean := False; -- Off-state selection for Run mode OSSR : Boolean := False; -- Break enable BKE : Boolean := False; -- Break polarity BKP : Boolean := False; -- Automatic output enable AOE : Boolean := False; -- Main output enable MOE : Boolean := False; -- unspecified Reserved_16_31 : HAL.Short := 16#0#; end record with Volatile_Full_Access, Size => 32, Bit_Order => System.Low_Order_First; for BDTR_Register use record DTG at 0 range 0 .. 7; LOCK at 0 range 8 .. 9; OSSI at 0 range 10 .. 10; OSSR at 0 range 11 .. 11; BKE at 0 range 12 .. 12; BKP at 0 range 13 .. 13; AOE at 0 range 14 .. 14; MOE at 0 range 15 .. 15; Reserved_16_31 at 0 range 16 .. 31; end record; ------------------ -- DCR_Register -- ------------------ subtype DCR_DBA_Field is HAL.UInt5; subtype DCR_DBL_Field is HAL.UInt5; -- DMA control register type DCR_Register is record -- DMA base address DBA : DCR_DBA_Field := 16#0#; -- unspecified Reserved_5_7 : HAL.UInt3 := 16#0#; -- DMA burst length DBL : DCR_DBL_Field := 16#0#; -- unspecified Reserved_13_31 : HAL.UInt19 := 16#0#; end record with Volatile_Full_Access, Size => 32, Bit_Order => System.Low_Order_First; for DCR_Register use record DBA at 0 range 0 .. 4; Reserved_5_7 at 0 range 5 .. 7; DBL at 0 range 8 .. 12; Reserved_13_31 at 0 range 13 .. 31; end record; ------------------- -- DMAR_Register -- ------------------- subtype DMAR_DMAB_Field is HAL.Short; -- DMA address for full transfer type DMAR_Register is record -- DMA register for burst accesses DMAB : DMAR_DMAB_Field := 16#0#; -- unspecified Reserved_16_31 : HAL.Short := 16#0#; end record with Volatile_Full_Access, Size => 32, Bit_Order => System.Low_Order_First; for DMAR_Register use record DMAB at 0 range 0 .. 15; Reserved_16_31 at 0 range 16 .. 31; end record; ------------------ -- CR2_Register -- ------------------ -- control register 2 type CR2_Register_1 is record -- unspecified Reserved_0_2 : HAL.UInt3 := 16#0#; -- Capture/compare DMA selection CCDS : Boolean := False; -- Master mode selection MMS : CR2_MMS_Field := 16#0#; -- TI1 selection TI1S : Boolean := False; -- unspecified Reserved_8_31 : HAL.UInt24 := 16#0#; end record with Volatile_Full_Access, Size => 32, Bit_Order => System.Low_Order_First; for CR2_Register_1 use record Reserved_0_2 at 0 range 0 .. 2; CCDS at 0 range 3 .. 3; MMS at 0 range 4 .. 6; TI1S at 0 range 7 .. 7; Reserved_8_31 at 0 range 8 .. 31; end record; ------------------- -- DIER_Register -- ------------------- -- DMA/Interrupt enable register type DIER_Register_1 is record -- Update interrupt enable UIE : Boolean := False; -- Capture/Compare 1 interrupt enable CC1IE : Boolean := False; -- Capture/Compare 2 interrupt enable CC2IE : Boolean := False; -- Capture/Compare 3 interrupt enable CC3IE : Boolean := False; -- Capture/Compare 4 interrupt enable CC4IE : Boolean := False; -- unspecified Reserved_5_5 : HAL.Bit := 16#0#; -- Trigger interrupt enable TIE : Boolean := False; -- unspecified Reserved_7_7 : HAL.Bit := 16#0#; -- Update DMA request enable UDE : Boolean := False; -- Capture/Compare 1 DMA request enable CC1DE : Boolean := False; -- Capture/Compare 2 DMA request enable CC2DE : Boolean := False; -- Capture/Compare 3 DMA request enable CC3DE : Boolean := False; -- Capture/Compare 4 DMA request enable CC4DE : Boolean := False; -- unspecified Reserved_13_13 : HAL.Bit := 16#0#; -- Trigger DMA request enable TDE : Boolean := False; -- unspecified Reserved_15_31 : HAL.UInt17 := 16#0#; end record with Volatile_Full_Access, Size => 32, Bit_Order => System.Low_Order_First; for DIER_Register_1 use record UIE at 0 range 0 .. 0; CC1IE at 0 range 1 .. 1; CC2IE at 0 range 2 .. 2; CC3IE at 0 range 3 .. 3; CC4IE at 0 range 4 .. 4; Reserved_5_5 at 0 range 5 .. 5; TIE at 0 range 6 .. 6; Reserved_7_7 at 0 range 7 .. 7; UDE at 0 range 8 .. 8; CC1DE at 0 range 9 .. 9; CC2DE at 0 range 10 .. 10; CC3DE at 0 range 11 .. 11; CC4DE at 0 range 12 .. 12; Reserved_13_13 at 0 range 13 .. 13; TDE at 0 range 14 .. 14; Reserved_15_31 at 0 range 15 .. 31; end record; ----------------- -- SR_Register -- ----------------- -- status register type SR_Register_1 is record -- Update interrupt flag UIF : Boolean := False; -- Capture/compare 1 interrupt flag CC1IF : Boolean := False; -- Capture/Compare 2 interrupt flag CC2IF : Boolean := False; -- Capture/Compare 3 interrupt flag CC3IF : Boolean := False; -- Capture/Compare 4 interrupt flag CC4IF : Boolean := False; -- unspecified Reserved_5_5 : HAL.Bit := 16#0#; -- Trigger interrupt flag TIF : Boolean := False; -- unspecified Reserved_7_8 : HAL.UInt2 := 16#0#; -- Capture/Compare 1 overcapture flag CC1OF : Boolean := False; -- Capture/compare 2 overcapture flag CC2OF : Boolean := False; -- Capture/Compare 3 overcapture flag CC3OF : Boolean := False; -- Capture/Compare 4 overcapture flag CC4OF : Boolean := False; -- unspecified Reserved_13_31 : HAL.UInt19 := 16#0#; end record with Volatile_Full_Access, Size => 32, Bit_Order => System.Low_Order_First; for SR_Register_1 use record UIF at 0 range 0 .. 0; CC1IF at 0 range 1 .. 1; CC2IF at 0 range 2 .. 2; CC3IF at 0 range 3 .. 3; CC4IF at 0 range 4 .. 4; Reserved_5_5 at 0 range 5 .. 5; TIF at 0 range 6 .. 6; Reserved_7_8 at 0 range 7 .. 8; CC1OF at 0 range 9 .. 9; CC2OF at 0 range 10 .. 10; CC3OF at 0 range 11 .. 11; CC4OF at 0 range 12 .. 12; Reserved_13_31 at 0 range 13 .. 31; end record; ------------------ -- EGR_Register -- ------------------ -- event generation register type EGR_Register_1 is record -- Write-only. Update generation UG : Boolean := False; -- Write-only. Capture/compare 1 generation CC1G : Boolean := False; -- Write-only. Capture/compare 2 generation CC2G : Boolean := False; -- Write-only. Capture/compare 3 generation CC3G : Boolean := False; -- Write-only. Capture/compare 4 generation CC4G : Boolean := False; -- unspecified Reserved_5_5 : HAL.Bit := 16#0#; -- Write-only. Trigger generation TG : Boolean := False; -- unspecified Reserved_7_31 : HAL.UInt25 := 16#0#; end record with Volatile_Full_Access, Size => 32, Bit_Order => System.Low_Order_First; for EGR_Register_1 use record UG at 0 range 0 .. 0; CC1G at 0 range 1 .. 1; CC2G at 0 range 2 .. 2; CC3G at 0 range 3 .. 3; CC4G at 0 range 4 .. 4; Reserved_5_5 at 0 range 5 .. 5; TG at 0 range 6 .. 6; Reserved_7_31 at 0 range 7 .. 31; end record; --------------------------- -- CCMR2_Output_Register -- --------------------------- -- capture/compare mode register 2 (output mode) type CCMR2_Output_Register_1 is record -- CC3S CC3S : CCMR2_Output_CC3S_Field := 16#0#; -- OC3FE OC3FE : Boolean := False; -- OC3PE OC3PE : Boolean := False; -- OC3M OC3M : CCMR2_Output_OC3M_Field := 16#0#; -- OC3CE OC3CE : Boolean := False; -- CC4S CC4S : CCMR2_Output_CC4S_Field := 16#0#; -- OC4FE OC4FE : Boolean := False; -- OC4PE OC4PE : Boolean := False; -- OC4M OC4M : CCMR2_Output_OC4M_Field := 16#0#; -- O24CE O24CE : Boolean := False; -- unspecified Reserved_16_31 : HAL.Short := 16#0#; end record with Volatile_Full_Access, Size => 32, Bit_Order => System.Low_Order_First; for CCMR2_Output_Register_1 use record CC3S at 0 range 0 .. 1; OC3FE at 0 range 2 .. 2; OC3PE at 0 range 3 .. 3; OC3M at 0 range 4 .. 6; OC3CE at 0 range 7 .. 7; CC4S at 0 range 8 .. 9; OC4FE at 0 range 10 .. 10; OC4PE at 0 range 11 .. 11; OC4M at 0 range 12 .. 14; O24CE at 0 range 15 .. 15; Reserved_16_31 at 0 range 16 .. 31; end record; ------------------- -- CCER_Register -- ------------------- -- capture/compare enable register type CCER_Register_1 is record -- Capture/Compare 1 output enable CC1E : Boolean := False; -- Capture/Compare 1 output Polarity CC1P : Boolean := False; -- unspecified Reserved_2_2 : HAL.Bit := 16#0#; -- Capture/Compare 1 output Polarity CC1NP : Boolean := False; -- Capture/Compare 2 output enable CC2E : Boolean := False; -- Capture/Compare 2 output Polarity CC2P : Boolean := False; -- unspecified Reserved_6_6 : HAL.Bit := 16#0#; -- Capture/Compare 2 output Polarity CC2NP : Boolean := False; -- Capture/Compare 3 output enable CC3E : Boolean := False; -- Capture/Compare 3 output Polarity CC3P : Boolean := False; -- unspecified Reserved_10_10 : HAL.Bit := 16#0#; -- Capture/Compare 3 output Polarity CC3NP : Boolean := False; -- Capture/Compare 4 output enable CC4E : Boolean := False; -- Capture/Compare 3 output Polarity CC4P : Boolean := False; -- unspecified Reserved_14_14 : HAL.Bit := 16#0#; -- Capture/Compare 4 output Polarity CC4NP : Boolean := False; -- unspecified Reserved_16_31 : HAL.Short := 16#0#; end record with Volatile_Full_Access, Size => 32, Bit_Order => System.Low_Order_First; for CCER_Register_1 use record CC1E at 0 range 0 .. 0; CC1P at 0 range 1 .. 1; Reserved_2_2 at 0 range 2 .. 2; CC1NP at 0 range 3 .. 3; CC2E at 0 range 4 .. 4; CC2P at 0 range 5 .. 5; Reserved_6_6 at 0 range 6 .. 6; CC2NP at 0 range 7 .. 7; CC3E at 0 range 8 .. 8; CC3P at 0 range 9 .. 9; Reserved_10_10 at 0 range 10 .. 10; CC3NP at 0 range 11 .. 11; CC4E at 0 range 12 .. 12; CC4P at 0 range 13 .. 13; Reserved_14_14 at 0 range 14 .. 14; CC4NP at 0 range 15 .. 15; Reserved_16_31 at 0 range 16 .. 31; end record; ------------------ -- CNT_Register -- ------------------ subtype CNT_CNT_L_Field is HAL.Short; subtype CNT_CNT_H_Field is HAL.Short; -- counter type CNT_Register_1 is record -- Low counter value CNT_L : CNT_CNT_L_Field := 16#0#; -- High counter value CNT_H : CNT_CNT_H_Field := 16#0#; end record with Volatile_Full_Access, Size => 32, Bit_Order => System.Low_Order_First; for CNT_Register_1 use record CNT_L at 0 range 0 .. 15; CNT_H at 0 range 16 .. 31; end record; ------------------ -- ARR_Register -- ------------------ subtype ARR_ARR_L_Field is HAL.Short; subtype ARR_ARR_H_Field is HAL.Short; -- auto-reload register type ARR_Register_1 is record -- Low Auto-reload value ARR_L : ARR_ARR_L_Field := 16#0#; -- High Auto-reload value ARR_H : ARR_ARR_H_Field := 16#0#; end record with Volatile_Full_Access, Size => 32, Bit_Order => System.Low_Order_First; for ARR_Register_1 use record ARR_L at 0 range 0 .. 15; ARR_H at 0 range 16 .. 31; end record; ------------------- -- CCR1_Register -- ------------------- subtype CCR1_CCR1_L_Field is HAL.Short; subtype CCR1_CCR1_H_Field is HAL.Short; -- capture/compare register 1 type CCR1_Register_1 is record -- Low Capture/Compare 1 value CCR1_L : CCR1_CCR1_L_Field := 16#0#; -- High Capture/Compare 1 value CCR1_H : CCR1_CCR1_H_Field := 16#0#; end record with Volatile_Full_Access, Size => 32, Bit_Order => System.Low_Order_First; for CCR1_Register_1 use record CCR1_L at 0 range 0 .. 15; CCR1_H at 0 range 16 .. 31; end record; ------------------- -- CCR2_Register -- ------------------- subtype CCR2_CCR2_L_Field is HAL.Short; subtype CCR2_CCR2_H_Field is HAL.Short; -- capture/compare register 2 type CCR2_Register_1 is record -- Low Capture/Compare 2 value CCR2_L : CCR2_CCR2_L_Field := 16#0#; -- High Capture/Compare 2 value CCR2_H : CCR2_CCR2_H_Field := 16#0#; end record with Volatile_Full_Access, Size => 32, Bit_Order => System.Low_Order_First; for CCR2_Register_1 use record CCR2_L at 0 range 0 .. 15; CCR2_H at 0 range 16 .. 31; end record; ------------------- -- CCR3_Register -- ------------------- subtype CCR3_CCR3_L_Field is HAL.Short; subtype CCR3_CCR3_H_Field is HAL.Short; -- capture/compare register 3 type CCR3_Register_1 is record -- Low Capture/Compare value CCR3_L : CCR3_CCR3_L_Field := 16#0#; -- High Capture/Compare value CCR3_H : CCR3_CCR3_H_Field := 16#0#; end record with Volatile_Full_Access, Size => 32, Bit_Order => System.Low_Order_First; for CCR3_Register_1 use record CCR3_L at 0 range 0 .. 15; CCR3_H at 0 range 16 .. 31; end record; ------------------- -- CCR4_Register -- ------------------- subtype CCR4_CCR4_L_Field is HAL.Short; subtype CCR4_CCR4_H_Field is HAL.Short; -- capture/compare register 4 type CCR4_Register_1 is record -- Low Capture/Compare value CCR4_L : CCR4_CCR4_L_Field := 16#0#; -- High Capture/Compare value CCR4_H : CCR4_CCR4_H_Field := 16#0#; end record with Volatile_Full_Access, Size => 32, Bit_Order => System.Low_Order_First; for CCR4_Register_1 use record CCR4_L at 0 range 0 .. 15; CCR4_H at 0 range 16 .. 31; end record; ----------------- -- OR_Register -- ----------------- subtype OR_ITR1_RMP_Field is HAL.UInt2; -- TIM5 option register type OR_Register is record -- unspecified Reserved_0_9 : HAL.UInt10 := 16#0#; -- Timer Input 4 remap ITR1_RMP : OR_ITR1_RMP_Field := 16#0#; -- unspecified Reserved_12_31 : HAL.UInt20 := 16#0#; end record with Volatile_Full_Access, Size => 32, Bit_Order => System.Low_Order_First; for OR_Register use record Reserved_0_9 at 0 range 0 .. 9; ITR1_RMP at 0 range 10 .. 11; Reserved_12_31 at 0 range 12 .. 31; end record; ----------------- -- OR_Register -- ----------------- subtype OR_IT4_RMP_Field is HAL.UInt2; -- TIM5 option register type OR_Register_1 is record -- unspecified Reserved_0_5 : HAL.UInt6 := 16#0#; -- Timer Input 4 remap IT4_RMP : OR_IT4_RMP_Field := 16#0#; -- unspecified Reserved_8_31 : HAL.UInt24 := 16#0#; end record with Volatile_Full_Access, Size => 32, Bit_Order => System.Low_Order_First; for OR_Register_1 use record Reserved_0_5 at 0 range 0 .. 5; IT4_RMP at 0 range 6 .. 7; Reserved_8_31 at 0 range 8 .. 31; end record; ------------------ -- CR1_Register -- ------------------ -- control register 1 type CR1_Register_1 is record -- Counter enable CEN : Boolean := False; -- Update disable UDIS : Boolean := False; -- Update request source URS : Boolean := False; -- One-pulse mode OPM : Boolean := False; -- unspecified Reserved_4_6 : HAL.UInt3 := 16#0#; -- Auto-reload preload enable ARPE : Boolean := False; -- Clock division CKD : CR1_CKD_Field := 16#0#; -- unspecified Reserved_10_31 : HAL.UInt22 := 16#0#; end record with Volatile_Full_Access, Size => 32, Bit_Order => System.Low_Order_First; for CR1_Register_1 use record CEN at 0 range 0 .. 0; UDIS at 0 range 1 .. 1; URS at 0 range 2 .. 2; OPM at 0 range 3 .. 3; Reserved_4_6 at 0 range 4 .. 6; ARPE at 0 range 7 .. 7; CKD at 0 range 8 .. 9; Reserved_10_31 at 0 range 10 .. 31; end record; ------------------ -- CR2_Register -- ------------------ -- control register 2 type CR2_Register_2 is record -- unspecified Reserved_0_3 : HAL.UInt4 := 16#0#; -- Master mode selection MMS : CR2_MMS_Field := 16#0#; -- unspecified Reserved_7_31 : HAL.UInt25 := 16#0#; end record with Volatile_Full_Access, Size => 32, Bit_Order => System.Low_Order_First; for CR2_Register_2 use record Reserved_0_3 at 0 range 0 .. 3; MMS at 0 range 4 .. 6; Reserved_7_31 at 0 range 7 .. 31; end record; ------------------- -- SMCR_Register -- ------------------- -- slave mode control register type SMCR_Register_1 is record -- Slave mode selection SMS : SMCR_SMS_Field := 16#0#; -- unspecified Reserved_3_3 : HAL.Bit := 16#0#; -- Trigger selection TS : SMCR_TS_Field := 16#0#; -- Master/Slave mode MSM : Boolean := False; -- unspecified Reserved_8_31 : HAL.UInt24 := 16#0#; end record with Volatile_Full_Access, Size => 32, Bit_Order => System.Low_Order_First; for SMCR_Register_1 use record SMS at 0 range 0 .. 2; Reserved_3_3 at 0 range 3 .. 3; TS at 0 range 4 .. 6; MSM at 0 range 7 .. 7; Reserved_8_31 at 0 range 8 .. 31; end record; ------------------- -- DIER_Register -- ------------------- -- DMA/Interrupt enable register type DIER_Register_2 is record -- Update interrupt enable UIE : Boolean := False; -- Capture/Compare 1 interrupt enable CC1IE : Boolean := False; -- Capture/Compare 2 interrupt enable CC2IE : Boolean := False; -- unspecified Reserved_3_5 : HAL.UInt3 := 16#0#; -- Trigger interrupt enable TIE : Boolean := False; -- unspecified Reserved_7_31 : HAL.UInt25 := 16#0#; end record with Volatile_Full_Access, Size => 32, Bit_Order => System.Low_Order_First; for DIER_Register_2 use record UIE at 0 range 0 .. 0; CC1IE at 0 range 1 .. 1; CC2IE at 0 range 2 .. 2; Reserved_3_5 at 0 range 3 .. 5; TIE at 0 range 6 .. 6; Reserved_7_31 at 0 range 7 .. 31; end record; ----------------- -- SR_Register -- ----------------- -- status register type SR_Register_2 is record -- Update interrupt flag UIF : Boolean := False; -- Capture/compare 1 interrupt flag CC1IF : Boolean := False; -- Capture/Compare 2 interrupt flag CC2IF : Boolean := False; -- unspecified Reserved_3_5 : HAL.UInt3 := 16#0#; -- Trigger interrupt flag TIF : Boolean := False; -- unspecified Reserved_7_8 : HAL.UInt2 := 16#0#; -- Capture/Compare 1 overcapture flag CC1OF : Boolean := False; -- Capture/compare 2 overcapture flag CC2OF : Boolean := False; -- unspecified Reserved_11_31 : HAL.UInt21 := 16#0#; end record with Volatile_Full_Access, Size => 32, Bit_Order => System.Low_Order_First; for SR_Register_2 use record UIF at 0 range 0 .. 0; CC1IF at 0 range 1 .. 1; CC2IF at 0 range 2 .. 2; Reserved_3_5 at 0 range 3 .. 5; TIF at 0 range 6 .. 6; Reserved_7_8 at 0 range 7 .. 8; CC1OF at 0 range 9 .. 9; CC2OF at 0 range 10 .. 10; Reserved_11_31 at 0 range 11 .. 31; end record; ------------------ -- EGR_Register -- ------------------ -- event generation register type EGR_Register_2 is record -- Write-only. Update generation UG : Boolean := False; -- Write-only. Capture/compare 1 generation CC1G : Boolean := False; -- Write-only. Capture/compare 2 generation CC2G : Boolean := False; -- unspecified Reserved_3_5 : HAL.UInt3 := 16#0#; -- Write-only. Trigger generation TG : Boolean := False; -- unspecified Reserved_7_31 : HAL.UInt25 := 16#0#; end record with Volatile_Full_Access, Size => 32, Bit_Order => System.Low_Order_First; for EGR_Register_2 use record UG at 0 range 0 .. 0; CC1G at 0 range 1 .. 1; CC2G at 0 range 2 .. 2; Reserved_3_5 at 0 range 3 .. 5; TG at 0 range 6 .. 6; Reserved_7_31 at 0 range 7 .. 31; end record; --------------------------- -- CCMR1_Output_Register -- --------------------------- -- capture/compare mode register 1 (output mode) type CCMR1_Output_Register_1 is record -- Capture/Compare 1 selection CC1S : CCMR1_Output_CC1S_Field := 16#0#; -- Output Compare 1 fast enable OC1FE : Boolean := False; -- Output Compare 1 preload enable OC1PE : Boolean := False; -- Output Compare 1 mode OC1M : CCMR1_Output_OC1M_Field := 16#0#; -- unspecified Reserved_7_7 : HAL.Bit := 16#0#; -- Capture/Compare 2 selection CC2S : CCMR1_Output_CC2S_Field := 16#0#; -- Output Compare 2 fast enable OC2FE : Boolean := False; -- Output Compare 2 preload enable OC2PE : Boolean := False; -- Output Compare 2 mode OC2M : CCMR1_Output_OC2M_Field := 16#0#; -- unspecified Reserved_15_31 : HAL.UInt17 := 16#0#; end record with Volatile_Full_Access, Size => 32, Bit_Order => System.Low_Order_First; for CCMR1_Output_Register_1 use record CC1S at 0 range 0 .. 1; OC1FE at 0 range 2 .. 2; OC1PE at 0 range 3 .. 3; OC1M at 0 range 4 .. 6; Reserved_7_7 at 0 range 7 .. 7; CC2S at 0 range 8 .. 9; OC2FE at 0 range 10 .. 10; OC2PE at 0 range 11 .. 11; OC2M at 0 range 12 .. 14; Reserved_15_31 at 0 range 15 .. 31; end record; -------------------------- -- CCMR1_Input_Register -- -------------------------- subtype CCMR1_Input_IC1F_Field_1 is HAL.UInt3; subtype CCMR1_Input_IC2F_Field_1 is HAL.UInt3; -- capture/compare mode register 1 (input mode) type CCMR1_Input_Register_1 is record -- Capture/Compare 1 selection CC1S : CCMR1_Input_CC1S_Field := 16#0#; -- Input capture 1 prescaler ICPCS : CCMR1_Input_ICPCS_Field := 16#0#; -- Input capture 1 filter IC1F : CCMR1_Input_IC1F_Field_1 := 16#0#; -- unspecified Reserved_7_7 : HAL.Bit := 16#0#; -- Capture/Compare 2 selection CC2S : CCMR1_Input_CC2S_Field := 16#0#; -- Input capture 2 prescaler IC2PCS : CCMR1_Input_IC2PCS_Field := 16#0#; -- Input capture 2 filter IC2F : CCMR1_Input_IC2F_Field_1 := 16#0#; -- unspecified Reserved_15_31 : HAL.UInt17 := 16#0#; end record with Volatile_Full_Access, Size => 32, Bit_Order => System.Low_Order_First; for CCMR1_Input_Register_1 use record CC1S at 0 range 0 .. 1; ICPCS at 0 range 2 .. 3; IC1F at 0 range 4 .. 6; Reserved_7_7 at 0 range 7 .. 7; CC2S at 0 range 8 .. 9; IC2PCS at 0 range 10 .. 11; IC2F at 0 range 12 .. 14; Reserved_15_31 at 0 range 15 .. 31; end record; ------------------- -- CCER_Register -- ------------------- -- capture/compare enable register type CCER_Register_2 is record -- Capture/Compare 1 output enable CC1E : Boolean := False; -- Capture/Compare 1 output Polarity CC1P : Boolean := False; -- unspecified Reserved_2_2 : HAL.Bit := 16#0#; -- Capture/Compare 1 output Polarity CC1NP : Boolean := False; -- Capture/Compare 2 output enable CC2E : Boolean := False; -- Capture/Compare 2 output Polarity CC2P : Boolean := False; -- unspecified Reserved_6_6 : HAL.Bit := 16#0#; -- Capture/Compare 2 output Polarity CC2NP : Boolean := False; -- unspecified Reserved_8_31 : HAL.UInt24 := 16#0#; end record with Volatile_Full_Access, Size => 32, Bit_Order => System.Low_Order_First; for CCER_Register_2 use record CC1E at 0 range 0 .. 0; CC1P at 0 range 1 .. 1; Reserved_2_2 at 0 range 2 .. 2; CC1NP at 0 range 3 .. 3; CC2E at 0 range 4 .. 4; CC2P at 0 range 5 .. 5; Reserved_6_6 at 0 range 6 .. 6; CC2NP at 0 range 7 .. 7; Reserved_8_31 at 0 range 8 .. 31; end record; ------------------ -- CR1_Register -- ------------------ -- control register 1 type CR1_Register_2 is record -- Counter enable CEN : Boolean := False; -- Update disable UDIS : Boolean := False; -- Update request source URS : Boolean := False; -- unspecified Reserved_3_6 : HAL.UInt4 := 16#0#; -- Auto-reload preload enable ARPE : Boolean := False; -- Clock division CKD : CR1_CKD_Field := 16#0#; -- unspecified Reserved_10_31 : HAL.UInt22 := 16#0#; end record with Volatile_Full_Access, Size => 32, Bit_Order => System.Low_Order_First; for CR1_Register_2 use record CEN at 0 range 0 .. 0; UDIS at 0 range 1 .. 1; URS at 0 range 2 .. 2; Reserved_3_6 at 0 range 3 .. 6; ARPE at 0 range 7 .. 7; CKD at 0 range 8 .. 9; Reserved_10_31 at 0 range 10 .. 31; end record; ------------------- -- DIER_Register -- ------------------- -- DMA/Interrupt enable register type DIER_Register_3 is record -- Update interrupt enable UIE : Boolean := False; -- Capture/Compare 1 interrupt enable CC1IE : Boolean := False; -- unspecified Reserved_2_31 : HAL.UInt30 := 16#0#; end record with Volatile_Full_Access, Size => 32, Bit_Order => System.Low_Order_First; for DIER_Register_3 use record UIE at 0 range 0 .. 0; CC1IE at 0 range 1 .. 1; Reserved_2_31 at 0 range 2 .. 31; end record; ----------------- -- SR_Register -- ----------------- -- status register type SR_Register_3 is record -- Update interrupt flag UIF : Boolean := False; -- Capture/compare 1 interrupt flag CC1IF : Boolean := False; -- unspecified Reserved_2_8 : HAL.UInt7 := 16#0#; -- Capture/Compare 1 overcapture flag CC1OF : Boolean := False; -- unspecified Reserved_10_31 : HAL.UInt22 := 16#0#; end record with Volatile_Full_Access, Size => 32, Bit_Order => System.Low_Order_First; for SR_Register_3 use record UIF at 0 range 0 .. 0; CC1IF at 0 range 1 .. 1; Reserved_2_8 at 0 range 2 .. 8; CC1OF at 0 range 9 .. 9; Reserved_10_31 at 0 range 10 .. 31; end record; ------------------ -- EGR_Register -- ------------------ -- event generation register type EGR_Register_3 is record -- Write-only. Update generation UG : Boolean := False; -- Write-only. Capture/compare 1 generation CC1G : Boolean := False; -- unspecified Reserved_2_31 : HAL.UInt30 := 16#0#; end record with Volatile_Full_Access, Size => 32, Bit_Order => System.Low_Order_First; for EGR_Register_3 use record UG at 0 range 0 .. 0; CC1G at 0 range 1 .. 1; Reserved_2_31 at 0 range 2 .. 31; end record; --------------------------- -- CCMR1_Output_Register -- --------------------------- -- capture/compare mode register 1 (output mode) type CCMR1_Output_Register_2 is record -- Capture/Compare 1 selection CC1S : CCMR1_Output_CC1S_Field := 16#0#; -- Output Compare 1 fast enable OC1FE : Boolean := False; -- Output Compare 1 preload enable OC1PE : Boolean := False; -- Output Compare 1 mode OC1M : CCMR1_Output_OC1M_Field := 16#0#; -- unspecified Reserved_7_31 : HAL.UInt25 := 16#0#; end record with Volatile_Full_Access, Size => 32, Bit_Order => System.Low_Order_First; for CCMR1_Output_Register_2 use record CC1S at 0 range 0 .. 1; OC1FE at 0 range 2 .. 2; OC1PE at 0 range 3 .. 3; OC1M at 0 range 4 .. 6; Reserved_7_31 at 0 range 7 .. 31; end record; -------------------------- -- CCMR1_Input_Register -- -------------------------- -- capture/compare mode register 1 (input mode) type CCMR1_Input_Register_2 is record -- Capture/Compare 1 selection CC1S : CCMR1_Input_CC1S_Field := 16#0#; -- Input capture 1 prescaler ICPCS : CCMR1_Input_ICPCS_Field := 16#0#; -- Input capture 1 filter IC1F : CCMR1_Input_IC1F_Field := 16#0#; -- unspecified Reserved_8_31 : HAL.UInt24 := 16#0#; end record with Volatile_Full_Access, Size => 32, Bit_Order => System.Low_Order_First; for CCMR1_Input_Register_2 use record CC1S at 0 range 0 .. 1; ICPCS at 0 range 2 .. 3; IC1F at 0 range 4 .. 7; Reserved_8_31 at 0 range 8 .. 31; end record; ------------------- -- CCER_Register -- ------------------- -- capture/compare enable register type CCER_Register_3 is record -- Capture/Compare 1 output enable CC1E : Boolean := False; -- Capture/Compare 1 output Polarity CC1P : Boolean := False; -- unspecified Reserved_2_2 : HAL.Bit := 16#0#; -- Capture/Compare 1 output Polarity CC1NP : Boolean := False; -- unspecified Reserved_4_31 : HAL.UInt28 := 16#0#; end record with Volatile_Full_Access, Size => 32, Bit_Order => System.Low_Order_First; for CCER_Register_3 use record CC1E at 0 range 0 .. 0; CC1P at 0 range 1 .. 1; Reserved_2_2 at 0 range 2 .. 2; CC1NP at 0 range 3 .. 3; Reserved_4_31 at 0 range 4 .. 31; end record; ----------------- -- OR_Register -- ----------------- subtype OR_RMP_Field is HAL.UInt2; -- option register type OR_Register_2 is record -- Input 1 remapping capability RMP : OR_RMP_Field := 16#0#; -- unspecified Reserved_2_31 : HAL.UInt30 := 16#0#; end record with Volatile_Full_Access, Size => 32, Bit_Order => System.Low_Order_First; for OR_Register_2 use record RMP at 0 range 0 .. 1; Reserved_2_31 at 0 range 2 .. 31; end record; ------------------ -- CR1_Register -- ------------------ -- control register 1 type CR1_Register_3 is record -- Counter enable CEN : Boolean := False; -- Update disable UDIS : Boolean := False; -- Update request source URS : Boolean := False; -- One-pulse mode OPM : Boolean := False; -- unspecified Reserved_4_6 : HAL.UInt3 := 16#0#; -- Auto-reload preload enable ARPE : Boolean := False; -- unspecified Reserved_8_31 : HAL.UInt24 := 16#0#; end record with Volatile_Full_Access, Size => 32, Bit_Order => System.Low_Order_First; for CR1_Register_3 use record CEN at 0 range 0 .. 0; UDIS at 0 range 1 .. 1; URS at 0 range 2 .. 2; OPM at 0 range 3 .. 3; Reserved_4_6 at 0 range 4 .. 6; ARPE at 0 range 7 .. 7; Reserved_8_31 at 0 range 8 .. 31; end record; ------------------- -- DIER_Register -- ------------------- -- DMA/Interrupt enable register type DIER_Register_4 is record -- Update interrupt enable UIE : Boolean := False; -- unspecified Reserved_1_7 : HAL.UInt7 := 16#0#; -- Update DMA request enable UDE : Boolean := False; -- unspecified Reserved_9_31 : HAL.UInt23 := 16#0#; end record with Volatile_Full_Access, Size => 32, Bit_Order => System.Low_Order_First; for DIER_Register_4 use record UIE at 0 range 0 .. 0; Reserved_1_7 at 0 range 1 .. 7; UDE at 0 range 8 .. 8; Reserved_9_31 at 0 range 9 .. 31; end record; ----------------- -- SR_Register -- ----------------- -- status register type SR_Register_4 is record -- Update interrupt flag UIF : Boolean := False; -- unspecified Reserved_1_31 : HAL.UInt31 := 16#0#; end record with Volatile_Full_Access, Size => 32, Bit_Order => System.Low_Order_First; for SR_Register_4 use record UIF at 0 range 0 .. 0; Reserved_1_31 at 0 range 1 .. 31; end record; ------------------ -- EGR_Register -- ------------------ -- event generation register type EGR_Register_4 is record -- Write-only. Update generation UG : Boolean := False; -- unspecified Reserved_1_31 : HAL.UInt31 := 16#0#; end record with Volatile_Full_Access, Size => 32, Bit_Order => System.Low_Order_First; for EGR_Register_4 use record UG at 0 range 0 .. 0; Reserved_1_31 at 0 range 1 .. 31; end record; ----------------- -- Peripherals -- ----------------- type TIM2_Disc is ( Output, Input); -- General purpose timers type TIM2_Peripheral (Discriminent : TIM2_Disc := Output) is record -- control register 1 CR1 : CR1_Register; -- control register 2 CR2 : CR2_Register_1; -- slave mode control register SMCR : SMCR_Register; -- DMA/Interrupt enable register DIER : DIER_Register_1; -- status register SR : SR_Register_1; -- event generation register EGR : EGR_Register_1; -- capture/compare enable register CCER : CCER_Register_1; -- counter CNT : CNT_Register_1; -- prescaler PSC : PSC_Register; -- auto-reload register ARR : ARR_Register_1; -- capture/compare register 1 CCR1 : CCR1_Register_1; -- capture/compare register 2 CCR2 : CCR2_Register_1; -- capture/compare register 3 CCR3 : CCR3_Register_1; -- capture/compare register 4 CCR4 : CCR4_Register_1; -- DMA control register DCR : DCR_Register; -- DMA address for full transfer DMAR : DMAR_Register; -- TIM5 option register OR_k : OR_Register; case Discriminent is when Output => -- capture/compare mode register 1 (output mode) CCMR1_Output : CCMR1_Output_Register; -- capture/compare mode register 2 (output mode) CCMR2_Output : CCMR2_Output_Register_1; when Input => -- capture/compare mode register 1 (input mode) CCMR1_Input : CCMR1_Input_Register; -- capture/compare mode register 2 (input mode) CCMR2_Input : CCMR2_Input_Register; end case; end record with Unchecked_Union, Volatile; for TIM2_Peripheral use record CR1 at 0 range 0 .. 31; CR2 at 4 range 0 .. 31; SMCR at 8 range 0 .. 31; DIER at 12 range 0 .. 31; SR at 16 range 0 .. 31; EGR at 20 range 0 .. 31; CCER at 32 range 0 .. 31; CNT at 36 range 0 .. 31; PSC at 40 range 0 .. 31; ARR at 44 range 0 .. 31; CCR1 at 52 range 0 .. 31; CCR2 at 56 range 0 .. 31; CCR3 at 60 range 0 .. 31; CCR4 at 64 range 0 .. 31; DCR at 72 range 0 .. 31; DMAR at 76 range 0 .. 31; OR_k at 80 range 0 .. 31; CCMR1_Output at 24 range 0 .. 31; CCMR2_Output at 28 range 0 .. 31; CCMR1_Input at 24 range 0 .. 31; CCMR2_Input at 28 range 0 .. 31; end record; -- General purpose timers TIM2_Periph : aliased TIM2_Peripheral with Import, Address => TIM2_Base; type TIM3_Disc is ( Output, Input); -- General purpose timers type TIM3_Peripheral (Discriminent : TIM3_Disc := Output) is record -- control register 1 CR1 : CR1_Register; -- control register 2 CR2 : CR2_Register_1; -- slave mode control register SMCR : SMCR_Register; -- DMA/Interrupt enable register DIER : DIER_Register_1; -- status register SR : SR_Register_1; -- event generation register EGR : EGR_Register_1; -- capture/compare enable register CCER : CCER_Register_1; -- counter CNT : CNT_Register_1; -- prescaler PSC : PSC_Register; -- auto-reload register ARR : ARR_Register_1; -- capture/compare register 1 CCR1 : CCR1_Register_1; -- capture/compare register 2 CCR2 : CCR2_Register_1; -- capture/compare register 3 CCR3 : CCR3_Register_1; -- capture/compare register 4 CCR4 : CCR4_Register_1; -- DMA control register DCR : DCR_Register; -- DMA address for full transfer DMAR : DMAR_Register; case Discriminent is when Output => -- capture/compare mode register 1 (output mode) CCMR1_Output : CCMR1_Output_Register; -- capture/compare mode register 2 (output mode) CCMR2_Output : CCMR2_Output_Register_1; when Input => -- capture/compare mode register 1 (input mode) CCMR1_Input : CCMR1_Input_Register; -- capture/compare mode register 2 (input mode) CCMR2_Input : CCMR2_Input_Register; end case; end record with Unchecked_Union, Volatile; for TIM3_Peripheral use record CR1 at 0 range 0 .. 31; CR2 at 4 range 0 .. 31; SMCR at 8 range 0 .. 31; DIER at 12 range 0 .. 31; SR at 16 range 0 .. 31; EGR at 20 range 0 .. 31; CCER at 32 range 0 .. 31; CNT at 36 range 0 .. 31; PSC at 40 range 0 .. 31; ARR at 44 range 0 .. 31; CCR1 at 52 range 0 .. 31; CCR2 at 56 range 0 .. 31; CCR3 at 60 range 0 .. 31; CCR4 at 64 range 0 .. 31; DCR at 72 range 0 .. 31; DMAR at 76 range 0 .. 31; CCMR1_Output at 24 range 0 .. 31; CCMR2_Output at 28 range 0 .. 31; CCMR1_Input at 24 range 0 .. 31; CCMR2_Input at 28 range 0 .. 31; end record; -- General purpose timers TIM3_Periph : aliased TIM3_Peripheral with Import, Address => TIM3_Base; -- General purpose timers TIM4_Periph : aliased TIM3_Peripheral with Import, Address => TIM4_Base; type TIM5_Disc is ( Output, Input); -- General-purpose-timers type TIM5_Peripheral (Discriminent : TIM5_Disc := Output) is record -- control register 1 CR1 : CR1_Register; -- control register 2 CR2 : CR2_Register_1; -- slave mode control register SMCR : SMCR_Register; -- DMA/Interrupt enable register DIER : DIER_Register_1; -- status register SR : SR_Register_1; -- event generation register EGR : EGR_Register_1; -- capture/compare enable register CCER : CCER_Register_1; -- counter CNT : CNT_Register_1; -- prescaler PSC : PSC_Register; -- auto-reload register ARR : ARR_Register_1; -- capture/compare register 1 CCR1 : CCR1_Register_1; -- capture/compare register 2 CCR2 : CCR2_Register_1; -- capture/compare register 3 CCR3 : CCR3_Register_1; -- capture/compare register 4 CCR4 : CCR4_Register_1; -- DMA control register DCR : DCR_Register; -- DMA address for full transfer DMAR : DMAR_Register; -- TIM5 option register OR_k : OR_Register_1; case Discriminent is when Output => -- capture/compare mode register 1 (output mode) CCMR1_Output : CCMR1_Output_Register; -- capture/compare mode register 2 (output mode) CCMR2_Output : CCMR2_Output_Register_1; when Input => -- capture/compare mode register 1 (input mode) CCMR1_Input : CCMR1_Input_Register; -- capture/compare mode register 2 (input mode) CCMR2_Input : CCMR2_Input_Register; end case; end record with Unchecked_Union, Volatile; for TIM5_Peripheral use record CR1 at 0 range 0 .. 31; CR2 at 4 range 0 .. 31; SMCR at 8 range 0 .. 31; DIER at 12 range 0 .. 31; SR at 16 range 0 .. 31; EGR at 20 range 0 .. 31; CCER at 32 range 0 .. 31; CNT at 36 range 0 .. 31; PSC at 40 range 0 .. 31; ARR at 44 range 0 .. 31; CCR1 at 52 range 0 .. 31; CCR2 at 56 range 0 .. 31; CCR3 at 60 range 0 .. 31; CCR4 at 64 range 0 .. 31; DCR at 72 range 0 .. 31; DMAR at 76 range 0 .. 31; OR_k at 80 range 0 .. 31; CCMR1_Output at 24 range 0 .. 31; CCMR2_Output at 28 range 0 .. 31; CCMR1_Input at 24 range 0 .. 31; CCMR2_Input at 28 range 0 .. 31; end record; -- General-purpose-timers TIM5_Periph : aliased TIM5_Peripheral with Import, Address => TIM5_Base; -- Basic timers type TIM6_Peripheral is record -- control register 1 CR1 : CR1_Register_3; -- control register 2 CR2 : CR2_Register_2; -- DMA/Interrupt enable register DIER : DIER_Register_4; -- status register SR : SR_Register_4; -- event generation register EGR : EGR_Register_4; -- counter CNT : CNT_Register; -- prescaler PSC : PSC_Register; -- auto-reload register ARR : ARR_Register; end record with Volatile; for TIM6_Peripheral use record CR1 at 0 range 0 .. 31; CR2 at 4 range 0 .. 31; DIER at 12 range 0 .. 31; SR at 16 range 0 .. 31; EGR at 20 range 0 .. 31; CNT at 36 range 0 .. 31; PSC at 40 range 0 .. 31; ARR at 44 range 0 .. 31; end record; -- Basic timers TIM6_Periph : aliased TIM6_Peripheral with Import, Address => TIM6_Base; -- Basic timers TIM7_Periph : aliased TIM6_Peripheral with Import, Address => TIM7_Base; type TIM12_Disc is ( Output, Input); -- General purpose timers type TIM12_Peripheral (Discriminent : TIM12_Disc := Output) is record -- control register 1 CR1 : CR1_Register_1; -- control register 2 CR2 : CR2_Register_2; -- slave mode control register SMCR : SMCR_Register_1; -- DMA/Interrupt enable register DIER : DIER_Register_2; -- status register SR : SR_Register_2; -- event generation register EGR : EGR_Register_2; -- capture/compare enable register CCER : CCER_Register_2; -- counter CNT : CNT_Register; -- prescaler PSC : PSC_Register; -- auto-reload register ARR : ARR_Register; -- capture/compare register 1 CCR1 : CCR1_Register; -- capture/compare register 2 CCR2 : CCR2_Register; case Discriminent is when Output => -- capture/compare mode register 1 (output mode) CCMR1_Output : CCMR1_Output_Register_1; when Input => -- capture/compare mode register 1 (input mode) CCMR1_Input : CCMR1_Input_Register_1; end case; end record with Unchecked_Union, Volatile; for TIM12_Peripheral use record CR1 at 0 range 0 .. 31; CR2 at 4 range 0 .. 31; SMCR at 8 range 0 .. 31; DIER at 12 range 0 .. 31; SR at 16 range 0 .. 31; EGR at 20 range 0 .. 31; CCER at 32 range 0 .. 31; CNT at 36 range 0 .. 31; PSC at 40 range 0 .. 31; ARR at 44 range 0 .. 31; CCR1 at 52 range 0 .. 31; CCR2 at 56 range 0 .. 31; CCMR1_Output at 24 range 0 .. 31; CCMR1_Input at 24 range 0 .. 31; end record; -- General purpose timers TIM12_Periph : aliased TIM12_Peripheral with Import, Address => TIM12_Base; -- General purpose timers TIM9_Periph : aliased TIM12_Peripheral with Import, Address => TIM9_Base; type TIM13_Disc is ( Output, Input); -- General-purpose-timers type TIM13_Peripheral (Discriminent : TIM13_Disc := Output) is record -- control register 1 CR1 : CR1_Register_2; -- DMA/Interrupt enable register DIER : DIER_Register_3; -- status register SR : SR_Register_3; -- event generation register EGR : EGR_Register_3; -- capture/compare enable register CCER : CCER_Register_3; -- counter CNT : CNT_Register; -- prescaler PSC : PSC_Register; -- auto-reload register ARR : ARR_Register; -- capture/compare register 1 CCR1 : CCR1_Register; case Discriminent is when Output => -- capture/compare mode register 1 (output mode) CCMR1_Output : CCMR1_Output_Register_2; when Input => -- capture/compare mode register 1 (input mode) CCMR1_Input : CCMR1_Input_Register_2; end case; end record with Unchecked_Union, Volatile; for TIM13_Peripheral use record CR1 at 0 range 0 .. 31; DIER at 12 range 0 .. 31; SR at 16 range 0 .. 31; EGR at 20 range 0 .. 31; CCER at 32 range 0 .. 31; CNT at 36 range 0 .. 31; PSC at 40 range 0 .. 31; ARR at 44 range 0 .. 31; CCR1 at 52 range 0 .. 31; CCMR1_Output at 24 range 0 .. 31; CCMR1_Input at 24 range 0 .. 31; end record; -- General-purpose-timers TIM13_Periph : aliased TIM13_Peripheral with Import, Address => TIM13_Base; -- General-purpose-timers TIM14_Periph : aliased TIM13_Peripheral with Import, Address => TIM14_Base; -- General-purpose-timers TIM10_Periph : aliased TIM13_Peripheral with Import, Address => TIM10_Base; type TIM1_Disc is ( Output, Input); -- Advanced-timers type TIM1_Peripheral (Discriminent : TIM1_Disc := Output) is record -- control register 1 CR1 : CR1_Register; -- control register 2 CR2 : CR2_Register; -- slave mode control register SMCR : SMCR_Register; -- DMA/Interrupt enable register DIER : DIER_Register; -- status register SR : SR_Register; -- event generation register EGR : EGR_Register; -- capture/compare enable register CCER : CCER_Register; -- counter CNT : CNT_Register; -- prescaler PSC : PSC_Register; -- auto-reload register ARR : ARR_Register; -- repetition counter register RCR : RCR_Register; -- capture/compare register 1 CCR1 : CCR1_Register; -- capture/compare register 2 CCR2 : CCR2_Register; -- capture/compare register 3 CCR3 : CCR3_Register; -- capture/compare register 4 CCR4 : CCR4_Register; -- break and dead-time register BDTR : BDTR_Register; -- DMA control register DCR : DCR_Register; -- DMA address for full transfer DMAR : DMAR_Register; case Discriminent is when Output => -- capture/compare mode register 1 (output mode) CCMR1_Output : CCMR1_Output_Register; -- capture/compare mode register 2 (output mode) CCMR2_Output : CCMR2_Output_Register; when Input => -- capture/compare mode register 1 (input mode) CCMR1_Input : CCMR1_Input_Register; -- capture/compare mode register 2 (input mode) CCMR2_Input : CCMR2_Input_Register; end case; end record with Unchecked_Union, Volatile; for TIM1_Peripheral use record CR1 at 0 range 0 .. 31; CR2 at 4 range 0 .. 31; SMCR at 8 range 0 .. 31; DIER at 12 range 0 .. 31; SR at 16 range 0 .. 31; EGR at 20 range 0 .. 31; CCER at 32 range 0 .. 31; CNT at 36 range 0 .. 31; PSC at 40 range 0 .. 31; ARR at 44 range 0 .. 31; RCR at 48 range 0 .. 31; CCR1 at 52 range 0 .. 31; CCR2 at 56 range 0 .. 31; CCR3 at 60 range 0 .. 31; CCR4 at 64 range 0 .. 31; BDTR at 68 range 0 .. 31; DCR at 72 range 0 .. 31; DMAR at 76 range 0 .. 31; CCMR1_Output at 24 range 0 .. 31; CCMR2_Output at 28 range 0 .. 31; CCMR1_Input at 24 range 0 .. 31; CCMR2_Input at 28 range 0 .. 31; end record; -- Advanced-timers TIM1_Periph : aliased TIM1_Peripheral with Import, Address => TIM1_Base; -- Advanced-timers TIM8_Periph : aliased TIM1_Peripheral with Import, Address => TIM8_Base; type TIM11_Disc is ( Output, Input); -- General-purpose-timers type TIM11_Peripheral (Discriminent : TIM11_Disc := Output) is record -- control register 1 CR1 : CR1_Register_2; -- DMA/Interrupt enable register DIER : DIER_Register_3; -- status register SR : SR_Register_3; -- event generation register EGR : EGR_Register_3; -- capture/compare enable register CCER : CCER_Register_3; -- counter CNT : CNT_Register; -- prescaler PSC : PSC_Register; -- auto-reload register ARR : ARR_Register; -- capture/compare register 1 CCR1 : CCR1_Register; -- option register OR_k : OR_Register_2; case Discriminent is when Output => -- capture/compare mode register 1 (output mode) CCMR1_Output : CCMR1_Output_Register_2; when Input => -- capture/compare mode register 1 (input mode) CCMR1_Input : CCMR1_Input_Register_2; end case; end record with Unchecked_Union, Volatile; for TIM11_Peripheral use record CR1 at 0 range 0 .. 31; DIER at 12 range 0 .. 31; SR at 16 range 0 .. 31; EGR at 20 range 0 .. 31; CCER at 32 range 0 .. 31; CNT at 36 range 0 .. 31; PSC at 40 range 0 .. 31; ARR at 44 range 0 .. 31; CCR1 at 52 range 0 .. 31; OR_k at 80 range 0 .. 31; CCMR1_Output at 24 range 0 .. 31; CCMR1_Input at 24 range 0 .. 31; end record; -- General-purpose-timers TIM11_Periph : aliased TIM11_Peripheral with Import, Address => TIM11_Base; end STM32_SVD.TIM;
aiunderstand/ADA-Nano33BLE
Ada
2,675
ads
------------------------------------------------------------------------------ -- -- -- Copyright (C) 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.Device; use nRF.Device; with nRF.GPIO; use nRF.GPIO; package NRF52_DK.LEDs is subtype User_LED is GPIO_Point; LED13 : User_LED renames P13; procedure Initialize_LEDs; procedure Turn_On (This : in out User_LED); procedure Turn_Off (This : in out User_LED); end NRF52_DK.LEDs;
persan/AdaYaml
Ada
599
ads
-- part of AdaYaml, (c) 2017 Felix Krause -- released under the terms of the MIT license, see the file "copying.txt" with Ada.Text_IO; package Yaml.Destination.Text_IO is type Instance is new Destination.Instance with private; function As_Destination (File : Ada.Text_IO.File_Access) return Pointer with Pre => Ada.Text_IO.Is_Open (File.all); overriding procedure Write_Data (D : in out Instance; Buffer : String); private type Instance is new Destination.Instance with record File_Pointer : Ada.Text_IO.File_Access; end record; end Yaml.Destination.Text_IO;
zhmu/ananas
Ada
5,029
ads
------------------------------------------------------------------------------ -- -- -- GNAT LIBRARY COMPONENTS -- -- -- -- G N A T . C R C 3 2 -- -- -- -- S p e c -- -- -- -- Copyright (C) 2004-2022, AdaCore -- -- -- -- GNAT is free software; you can redistribute it and/or modify it under -- -- terms of the GNU General Public License as published by the Free Soft- -- -- ware Foundation; either version 3, or (at your option) any later ver- -- -- sion. GNAT is distributed in the hope that it will be useful, but WITH- -- -- OUT ANY WARRANTY; without even the implied warranty of MERCHANTABILITY -- -- or FITNESS FOR A PARTICULAR PURPOSE. -- -- -- -- As a special exception under Section 7 of GPL version 3, you are granted -- -- additional permissions described in the GCC Runtime Library Exception, -- -- version 3.1, as published by the Free Software Foundation. -- -- -- -- You should have received a copy of the GNU General Public License and -- -- a copy of the GCC Runtime Library Exception along with this program; -- -- see the files COPYING3 and COPYING.RUNTIME respectively. If not, see -- -- <http://www.gnu.org/licenses/>. -- -- -- -- GNAT was originally developed by the GNAT team at New York University. -- -- Extensive contributions were provided by Ada Core Technologies Inc. -- -- -- ------------------------------------------------------------------------------ -- This package provides routines for computing a commonly used checksum -- called CRC-32. This is a checksum based on treating the binary data -- as a polynomial over a binary field, and the exact specifications of -- the CRC-32 algorithm are as follows: -- Name : "CRC-32" -- Width : 32 -- Poly : 04C11DB7 -- Init : FFFFFFFF -- RefIn : True -- RefOut : True -- XorOut : FFFFFFFF -- Check : CBF43926 -- Note that this is the algorithm used by PKZip, Ethernet and FDDI -- For more information about this algorithm see: -- ftp://ftp.rocksoft.com/papers/crc_v3.txt -- "A Painless Guide to CRC Error Detection Algorithms", Ross N. Williams -- "Computation of Cyclic Redundancy Checks via Table Look-Up", Communications -- of the ACM, Vol. 31 No. 8, pp.1008-1013 Aug. 1988. Sarwate, D.V. with Ada.Streams; with Interfaces; with System.CRC32; package GNAT.CRC32 is subtype CRC32 is System.CRC32.CRC32; -- Used to represent CRC32 values, which are 32 bit bit-strings procedure Initialize (C : out CRC32) renames System.CRC32.Initialize; -- Initialize CRC value by assigning the standard Init value (16#FFFF_FFFF) procedure Update (C : in out CRC32; Value : Character) renames System.CRC32.Update; -- Evolve CRC by including the contribution from Character'Pos (Value) procedure Update (C : in out CRC32; Value : String); -- For each character in the Value string call above routine procedure Wide_Update (C : in out CRC32; Value : Wide_Character); -- Evolve CRC by including the contribution from Wide_Character'Pos (Value) -- with the bytes being included in the natural memory order. procedure Wide_Update (C : in out CRC32; Value : Wide_String); -- For each character in the Value string call above routine procedure Update (C : in out CRC32; Value : Ada.Streams.Stream_Element); -- Evolve CRC by including the contribution from Value procedure Update (C : in out CRC32; Value : Ada.Streams.Stream_Element_Array); -- For each element in the Value array call above routine function Get_Value (C : CRC32) return Interfaces.Unsigned_32 renames System.CRC32.Get_Value; -- Get_Value computes the CRC32 value by performing an XOR with the -- standard XorOut value (16#FFFF_FFFF). Note that this does not -- change the value of C, so it may be used to retrieve intermediate -- values of the CRC32 value during a sequence of Update calls. pragma Inline (Update); pragma Inline (Wide_Update); end GNAT.CRC32;
onedigitallife-net/Byron
Ada
534
ads
Pragma Ada_2012; Pragma Assertion_Policy( Check ); Generic Type Index_Type is (<>); Type Element_Type (<>) is limited private; Type Vector (<>) is limited private; with Function First_Index (Container : Vector) return Index_Type is <>; with Function Last_Index (Container : Vector) return Index_Type is <>; with Function Element( Container : Vector; Index : Index_Type ) return Element_Type is <>; Package Byron.Generics.Vector with Pure, Spark_Mode => On is End Byron.Generics.Vector;
kjseefried/coreland-cgbc
Ada
681
adb
with CGBC.Bounded_Wide_Strings; with Test; procedure T_WBstr_Truncate_01 is package BS renames CGBC.Bounded_Wide_Strings; TC : Test.Context_t; S1 : BS.Bounded_String (8); begin Test.Initialize (Test_Context => TC, Program => "t_wbstr_truncate_01", Test_DB => "TEST_DB", Test_Results => "TEST_RESULTS"); BS.Append (S1, "ABCD"); pragma Assert (BS.Length (S1) = 4); BS.Truncate (S1); Test.Check (TC, 1245, BS.Length (S1) = 0, "BS.Length (S1) = 0"); Test.Check (TC, 1246, BS.Maximum_Length (S1) = 8, "BS.Maximum_Length (S1) = 8"); Test.Check (TC, 1247, BS.To_String (S1) = "", "BS.To_String (S1) = """""); end T_WBstr_Truncate_01;
apple-oss-distributions/old_ncurses
Ada
4,297
ads
------------------------------------------------------------------------------ -- -- -- GNAT ncurses Binding -- -- -- -- Terminal_Interface.Curses.Terminfo -- -- -- -- S P E C -- -- -- ------------------------------------------------------------------------------ -- Copyright (c) 2000 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: Eugene V. Melaragno <[email protected]> 2000 -- Version Control: -- $Revision: 1.1.1.1 $ -- Binding Version 01.00 ------------------------------------------------------------------------------ with Interfaces.C; package Terminal_Interface.Curses.Terminfo is pragma Preelaborate (Terminal_Interface.Curses.Terminfo); -- |===================================================================== -- | Man page curs_terminfo.3x -- |===================================================================== -- Not implemented: setupterm, setterm, set_curterm, del_curterm, -- restartterm, tparm, putp, vidputs, vidattr, -- mvcur type Terminfo_String is new String; -- | procedure Get_String (Name : String; Value : out Terminfo_String; Result : out Boolean); function Has_String (Name : String) return Boolean; -- AKA: tigetstr() -- | function Get_Flag (Name : String) return Boolean; -- AKA: tigetflag() -- | function Get_Number (Name : String) return Integer; -- AKA: tigetnum() type putctype is access function (c : Interfaces.C.int) return Interfaces.C.int; pragma Convention (C, putctype); -- | procedure Put_String (Str : Terminfo_String; affcnt : Natural := 1; putc : putctype := null); -- AKA: tputs() end Terminal_Interface.Curses.Terminfo;
reznikmm/matreshka
Ada
3,780
adb
------------------------------------------------------------------------------ -- -- -- Matreshka Project -- -- -- -- Open Document Toolkit -- -- -- -- Runtime Library Component -- -- -- ------------------------------------------------------------------------------ -- -- -- Copyright © 2013, 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 ODF.Constants; package body Matreshka.ODF_Attributes.FO.Background_Color is -------------------- -- Get_Local_Name -- -------------------- overriding function Get_Local_Name (Self : not null access constant FO_Background_Color_Node) return League.Strings.Universal_String is begin return ODF.Constants.Background_Color_Name; end Get_Local_Name; end Matreshka.ODF_Attributes.FO.Background_Color;
rahulyhg/swaggy-jenkins
Ada
174,305
adb
-- Swaggy Jenkins -- Jenkins API clients generated from Swagger / Open API specification -- -- OpenAPI spec version: 1.0.0 -- Contact: [email protected] -- -- NOTE: This package is auto generated by the swagger code generator 3.2.1-SNAPSHOT. -- https://openapi-generator.tech -- Do not edit the class manually. package body .Models is use Swagger.Streams; procedure Serialize (Into : in out Swagger.Streams.Output_Stream'Class; Name : in String; Value : in Body_Type) is begin Into.Start_Entity (Name); Into.Write_Entity ("favorite", Value.Favorite); Into.End_Entity (Name); end Serialize; procedure Serialize (Into : in out Swagger.Streams.Output_Stream'Class; Name : in String; Value : in Body_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 Body_Type) is Object : Swagger.Value_Type; begin Swagger.Streams.Deserialize (From, Name, Object); Swagger.Streams.Deserialize (Object, "favorite", Value.Favorite); end Deserialize; procedure Deserialize (From : in Swagger.Value_Type; Name : in String; Value : out Body_Type_Vectors.Vector) is List : Swagger.Value_Array_Type; Item : Body_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); Into.Write_Entity ("_class", Value._class); Into.Write_Entity ("id", Value.Id); Into.Write_Entity ("fullName", Value.Full_Name); Into.Write_Entity ("email", Value.Email); 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 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, "_class", Value._class); Swagger.Streams.Deserialize (Object, "id", Value.Id); Swagger.Streams.Deserialize (Object, "fullName", Value.Full_Name); Swagger.Streams.Deserialize (Object, "email", Value.Email); Swagger.Streams.Deserialize (Object, "name", Value.Name); 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 GithubContent_Type) is begin Into.Start_Entity (Name); Into.Write_Entity ("name", Value.Name); Into.Write_Entity ("sha", Value.Sha); Into.Write_Entity ("_class", Value._class); Into.Write_Entity ("repo", Value.Repo); Into.Write_Entity ("size", Value.Size); Into.Write_Entity ("owner", Value.Owner); Into.Write_Entity ("path", Value.Path); Into.Write_Entity ("base64Data", Value.Base64_Data); Into.End_Entity (Name); end Serialize; procedure Serialize (Into : in out Swagger.Streams.Output_Stream'Class; Name : in String; Value : in GithubContent_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 GithubContent_Type) is Object : Swagger.Value_Type; begin Swagger.Streams.Deserialize (From, Name, Object); Swagger.Streams.Deserialize (Object, "name", Value.Name); Swagger.Streams.Deserialize (Object, "sha", Value.Sha); Swagger.Streams.Deserialize (Object, "_class", Value._class); Swagger.Streams.Deserialize (Object, "repo", Value.Repo); Swagger.Streams.Deserialize (Object, "size", Value.Size); Swagger.Streams.Deserialize (Object, "owner", Value.Owner); Swagger.Streams.Deserialize (Object, "path", Value.Path); Swagger.Streams.Deserialize (Object, "base64Data", Value.Base64_Data); end Deserialize; procedure Deserialize (From : in Swagger.Value_Type; Name : in String; Value : out GithubContent_Type_Vectors.Vector) is List : Swagger.Value_Array_Type; Item : GithubContent_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 GithubFile_Type) is begin Into.Start_Entity (Name); Serialize (Into, "content", Value.Content); Into.Write_Entity ("_class", Value._class); Into.End_Entity (Name); end Serialize; procedure Serialize (Into : in out Swagger.Streams.Output_Stream'Class; Name : in String; Value : in GithubFile_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 GithubFile_Type) is Object : Swagger.Value_Type; begin Swagger.Streams.Deserialize (From, Name, Object); Deserialize (Object, "content", Value.Content); Swagger.Streams.Deserialize (Object, "_class", Value._class); end Deserialize; procedure Deserialize (From : in Swagger.Value_Type; Name : in String; Value : out GithubFile_Type_Vectors.Vector) is List : Swagger.Value_Array_Type; Item : GithubFile_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 GenericResource_Type) is begin Into.Start_Entity (Name); Into.Write_Entity ("_class", Value._class); Into.Write_Entity ("displayName", Value.Display_Name); Into.Write_Entity ("durationInMillis", Value.Duration_In_Millis); Into.Write_Entity ("id", Value.Id); Into.Write_Entity ("result", Value.Result); Into.Write_Entity ("startTime", Value.Start_Time); Into.End_Entity (Name); end Serialize; procedure Serialize (Into : in out Swagger.Streams.Output_Stream'Class; Name : in String; Value : in GenericResource_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 GenericResource_Type) is Object : Swagger.Value_Type; begin Swagger.Streams.Deserialize (From, Name, Object); Swagger.Streams.Deserialize (Object, "_class", Value._class); Swagger.Streams.Deserialize (Object, "displayName", Value.Display_Name); Swagger.Streams.Deserialize (Object, "durationInMillis", Value.Duration_In_Millis); Swagger.Streams.Deserialize (Object, "id", Value.Id); Swagger.Streams.Deserialize (Object, "result", Value.Result); Swagger.Streams.Deserialize (Object, "startTime", Value.Start_Time); end Deserialize; procedure Deserialize (From : in Swagger.Value_Type; Name : in String; Value : out GenericResource_Type_Vectors.Vector) is List : Swagger.Value_Array_Type; Item : GenericResource_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 PipelineRunartifacts_Type) is begin Into.Start_Entity (Name); Into.Write_Entity ("name", Value.Name); Into.Write_Entity ("size", Value.Size); Into.Write_Entity ("url", Value.Url); Into.Write_Entity ("_class", Value._class); Into.End_Entity (Name); end Serialize; procedure Serialize (Into : in out Swagger.Streams.Output_Stream'Class; Name : in String; Value : in PipelineRunartifacts_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 PipelineRunartifacts_Type) is Object : Swagger.Value_Type; begin Swagger.Streams.Deserialize (From, Name, Object); Swagger.Streams.Deserialize (Object, "name", Value.Name); Swagger.Streams.Deserialize (Object, "size", Value.Size); Swagger.Streams.Deserialize (Object, "url", Value.Url); Swagger.Streams.Deserialize (Object, "_class", Value._class); end Deserialize; procedure Deserialize (From : in Swagger.Value_Type; Name : in String; Value : out PipelineRunartifacts_Type_Vectors.Vector) is List : Swagger.Value_Array_Type; Item : PipelineRunartifacts_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 PipelineRun_Type) is begin Into.Start_Entity (Name); Into.Write_Entity ("_class", Value._class); Serialize (Into, "artifacts", Value.Artifacts); Into.Write_Entity ("durationInMillis", Value.Duration_In_Millis); Into.Write_Entity ("estimatedDurationInMillis", Value.Estimated_Duration_In_Millis); Into.Write_Entity ("enQueueTime", Value.En_Queue_Time); Into.Write_Entity ("endTime", Value.End_Time); Into.Write_Entity ("id", Value.Id); Into.Write_Entity ("organization", Value.Organization); Into.Write_Entity ("pipeline", Value.Pipeline); Into.Write_Entity ("result", Value.Result); Into.Write_Entity ("runSummary", Value.Run_Summary); Into.Write_Entity ("startTime", Value.Start_Time); Into.Write_Entity ("state", Value.State); Into.Write_Entity ("type", Value.P_Type); Into.Write_Entity ("commitId", Value.Commit_Id); Into.End_Entity (Name); end Serialize; procedure Serialize (Into : in out Swagger.Streams.Output_Stream'Class; Name : in String; Value : in PipelineRun_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 PipelineRun_Type) is Object : Swagger.Value_Type; begin Swagger.Streams.Deserialize (From, Name, Object); Swagger.Streams.Deserialize (Object, "_class", Value._class); Deserialize (Object, "artifacts", Value.Artifacts); Swagger.Streams.Deserialize (Object, "durationInMillis", Value.Duration_In_Millis); Swagger.Streams.Deserialize (Object, "estimatedDurationInMillis", Value.Estimated_Duration_In_Millis); Swagger.Streams.Deserialize (Object, "enQueueTime", Value.En_Queue_Time); Swagger.Streams.Deserialize (Object, "endTime", Value.End_Time); Swagger.Streams.Deserialize (Object, "id", Value.Id); Swagger.Streams.Deserialize (Object, "organization", Value.Organization); Swagger.Streams.Deserialize (Object, "pipeline", Value.Pipeline); Swagger.Streams.Deserialize (Object, "result", Value.Result); Swagger.Streams.Deserialize (Object, "runSummary", Value.Run_Summary); Swagger.Streams.Deserialize (Object, "startTime", Value.Start_Time); Swagger.Streams.Deserialize (Object, "state", Value.State); Swagger.Streams.Deserialize (Object, "type", Value.P_Type); Swagger.Streams.Deserialize (Object, "commitId", Value.Commit_Id); end Deserialize; procedure Deserialize (From : in Swagger.Value_Type; Name : in String; Value : out PipelineRun_Type_Vectors.Vector) is List : Swagger.Value_Array_Type; Item : PipelineRun_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 QueueItemImpl_Type) is begin Into.Start_Entity (Name); Into.Write_Entity ("_class", Value._class); Into.Write_Entity ("expectedBuildNumber", Value.Expected_Build_Number); Into.Write_Entity ("id", Value.Id); Into.Write_Entity ("pipeline", Value.Pipeline); Into.Write_Entity ("queuedTime", Value.Queued_Time); Into.End_Entity (Name); end Serialize; procedure Serialize (Into : in out Swagger.Streams.Output_Stream'Class; Name : in String; Value : in QueueItemImpl_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 QueueItemImpl_Type) is Object : Swagger.Value_Type; begin Swagger.Streams.Deserialize (From, Name, Object); Swagger.Streams.Deserialize (Object, "_class", Value._class); Swagger.Streams.Deserialize (Object, "expectedBuildNumber", Value.Expected_Build_Number); Swagger.Streams.Deserialize (Object, "id", Value.Id); Swagger.Streams.Deserialize (Object, "pipeline", Value.Pipeline); Swagger.Streams.Deserialize (Object, "queuedTime", Value.Queued_Time); end Deserialize; procedure Deserialize (From : in Swagger.Value_Type; Name : in String; Value : out QueueItemImpl_Type_Vectors.Vector) is List : Swagger.Value_Array_Type; Item : QueueItemImpl_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 PipelineBranchesitempullRequestlinks_Type) is begin Into.Start_Entity (Name); Into.Write_Entity ("self", Value.Self); Into.Write_Entity ("_class", Value._class); Into.End_Entity (Name); end Serialize; procedure Serialize (Into : in out Swagger.Streams.Output_Stream'Class; Name : in String; Value : in PipelineBranchesitempullRequestlinks_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 PipelineBranchesitempullRequestlinks_Type) is Object : Swagger.Value_Type; begin Swagger.Streams.Deserialize (From, Name, Object); Swagger.Streams.Deserialize (Object, "self", Value.Self); Swagger.Streams.Deserialize (Object, "_class", Value._class); end Deserialize; procedure Deserialize (From : in Swagger.Value_Type; Name : in String; Value : out PipelineBranchesitempullRequestlinks_Type_Vectors.Vector) is List : Swagger.Value_Array_Type; Item : PipelineBranchesitempullRequestlinks_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 PipelineBranchesitempullRequest_Type) is begin Into.Start_Entity (Name); Serialize (Into, "_links", Value._links); Into.Write_Entity ("author", Value.Author); Into.Write_Entity ("id", Value.Id); Into.Write_Entity ("title", Value.Title); Into.Write_Entity ("url", Value.Url); Into.Write_Entity ("_class", Value._class); Into.End_Entity (Name); end Serialize; procedure Serialize (Into : in out Swagger.Streams.Output_Stream'Class; Name : in String; Value : in PipelineBranchesitempullRequest_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 PipelineBranchesitempullRequest_Type) is Object : Swagger.Value_Type; begin Swagger.Streams.Deserialize (From, Name, Object); Deserialize (Object, "_links", Value._links); Swagger.Streams.Deserialize (Object, "author", Value.Author); Swagger.Streams.Deserialize (Object, "id", Value.Id); Swagger.Streams.Deserialize (Object, "title", Value.Title); Swagger.Streams.Deserialize (Object, "url", Value.Url); Swagger.Streams.Deserialize (Object, "_class", Value._class); end Deserialize; procedure Deserialize (From : in Swagger.Value_Type; Name : in String; Value : out PipelineBranchesitempullRequest_Type_Vectors.Vector) is List : Swagger.Value_Array_Type; Item : PipelineBranchesitempullRequest_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 PipelineActivityartifacts_Type) is begin Into.Start_Entity (Name); Into.Write_Entity ("name", Value.Name); Into.Write_Entity ("size", Value.Size); Into.Write_Entity ("url", Value.Url); Into.Write_Entity ("_class", Value._class); Into.End_Entity (Name); end Serialize; procedure Serialize (Into : in out Swagger.Streams.Output_Stream'Class; Name : in String; Value : in PipelineActivityartifacts_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 PipelineActivityartifacts_Type) is Object : Swagger.Value_Type; begin Swagger.Streams.Deserialize (From, Name, Object); Swagger.Streams.Deserialize (Object, "name", Value.Name); Swagger.Streams.Deserialize (Object, "size", Value.Size); Swagger.Streams.Deserialize (Object, "url", Value.Url); Swagger.Streams.Deserialize (Object, "_class", Value._class); end Deserialize; procedure Deserialize (From : in Swagger.Value_Type; Name : in String; Value : out PipelineActivityartifacts_Type_Vectors.Vector) is List : Swagger.Value_Array_Type; Item : PipelineActivityartifacts_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 PipelineActivity_Type) is begin Into.Start_Entity (Name); Into.Write_Entity ("_class", Value._class); Serialize (Into, "artifacts", Value.Artifacts); Into.Write_Entity ("durationInMillis", Value.Duration_In_Millis); Into.Write_Entity ("estimatedDurationInMillis", Value.Estimated_Duration_In_Millis); Into.Write_Entity ("enQueueTime", Value.En_Queue_Time); Into.Write_Entity ("endTime", Value.End_Time); Into.Write_Entity ("id", Value.Id); Into.Write_Entity ("organization", Value.Organization); Into.Write_Entity ("pipeline", Value.Pipeline); Into.Write_Entity ("result", Value.Result); Into.Write_Entity ("runSummary", Value.Run_Summary); Into.Write_Entity ("startTime", Value.Start_Time); Into.Write_Entity ("state", Value.State); Into.Write_Entity ("type", Value.P_Type); Into.Write_Entity ("commitId", Value.Commit_Id); Into.End_Entity (Name); end Serialize; procedure Serialize (Into : in out Swagger.Streams.Output_Stream'Class; Name : in String; Value : in PipelineActivity_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 PipelineActivity_Type) is Object : Swagger.Value_Type; begin Swagger.Streams.Deserialize (From, Name, Object); Swagger.Streams.Deserialize (Object, "_class", Value._class); Deserialize (Object, "artifacts", Value.Artifacts); Swagger.Streams.Deserialize (Object, "durationInMillis", Value.Duration_In_Millis); Swagger.Streams.Deserialize (Object, "estimatedDurationInMillis", Value.Estimated_Duration_In_Millis); Swagger.Streams.Deserialize (Object, "enQueueTime", Value.En_Queue_Time); Swagger.Streams.Deserialize (Object, "endTime", Value.End_Time); Swagger.Streams.Deserialize (Object, "id", Value.Id); Swagger.Streams.Deserialize (Object, "organization", Value.Organization); Swagger.Streams.Deserialize (Object, "pipeline", Value.Pipeline); Swagger.Streams.Deserialize (Object, "result", Value.Result); Swagger.Streams.Deserialize (Object, "runSummary", Value.Run_Summary); Swagger.Streams.Deserialize (Object, "startTime", Value.Start_Time); Swagger.Streams.Deserialize (Object, "state", Value.State); Swagger.Streams.Deserialize (Object, "type", Value.P_Type); Swagger.Streams.Deserialize (Object, "commitId", Value.Commit_Id); end Deserialize; procedure Deserialize (From : in Swagger.Value_Type; Name : in String; Value : out PipelineActivity_Type_Vectors.Vector) is List : Swagger.Value_Array_Type; Item : PipelineActivity_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 ClassesByClass_Type) is begin Into.Start_Entity (Name); Serialize (Into, "classes", Value.Classes); Into.Write_Entity ("_class", Value._class); Into.End_Entity (Name); end Serialize; procedure Serialize (Into : in out Swagger.Streams.Output_Stream'Class; Name : in String; Value : in ClassesByClass_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 ClassesByClass_Type) is Object : Swagger.Value_Type; begin Swagger.Streams.Deserialize (From, Name, Object); Swagger.Streams.Deserialize (Object, "classes", Value.Classes); Swagger.Streams.Deserialize (Object, "_class", Value._class); end Deserialize; procedure Deserialize (From : in Swagger.Value_Type; Name : in String; Value : out ClassesByClass_Type_Vectors.Vector) is List : Swagger.Value_Array_Type; Item : ClassesByClass_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 Link_Type) is begin Into.Start_Entity (Name); Into.Write_Entity ("_class", Value._class); Into.Write_Entity ("href", Value.Href); Into.End_Entity (Name); end Serialize; procedure Serialize (Into : in out Swagger.Streams.Output_Stream'Class; Name : in String; Value : in Link_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 Link_Type) is Object : Swagger.Value_Type; begin Swagger.Streams.Deserialize (From, Name, Object); Swagger.Streams.Deserialize (Object, "_class", Value._class); Swagger.Streams.Deserialize (Object, "href", Value.Href); end Deserialize; procedure Deserialize (From : in Swagger.Value_Type; Name : in String; Value : out Link_Type_Vectors.Vector) is List : Swagger.Value_Array_Type; Item : Link_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 PipelineRunImpllinks_Type) is begin Into.Start_Entity (Name); Serialize (Into, "nodes", Value.Nodes); Serialize (Into, "log", Value.Log); Serialize (Into, "self", Value.Self); Serialize (Into, "actions", Value.Actions); Serialize (Into, "steps", Value.Steps); Into.Write_Entity ("_class", Value._class); Into.End_Entity (Name); end Serialize; procedure Serialize (Into : in out Swagger.Streams.Output_Stream'Class; Name : in String; Value : in PipelineRunImpllinks_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 PipelineRunImpllinks_Type) is Object : Swagger.Value_Type; begin Swagger.Streams.Deserialize (From, Name, Object); Deserialize (Object, "nodes", Value.Nodes); Deserialize (Object, "log", Value.Log); Deserialize (Object, "self", Value.Self); Deserialize (Object, "actions", Value.Actions); Deserialize (Object, "steps", Value.Steps); Swagger.Streams.Deserialize (Object, "_class", Value._class); end Deserialize; procedure Deserialize (From : in Swagger.Value_Type; Name : in String; Value : out PipelineRunImpllinks_Type_Vectors.Vector) is List : Swagger.Value_Array_Type; Item : PipelineRunImpllinks_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 PipelineRunImpl_Type) is begin Into.Start_Entity (Name); Into.Write_Entity ("_class", Value._class); Serialize (Into, "_links", Value._links); Into.Write_Entity ("durationInMillis", Value.Duration_In_Millis); Into.Write_Entity ("enQueueTime", Value.En_Queue_Time); Into.Write_Entity ("endTime", Value.End_Time); Into.Write_Entity ("estimatedDurationInMillis", Value.Estimated_Duration_In_Millis); Into.Write_Entity ("id", Value.Id); Into.Write_Entity ("organization", Value.Organization); Into.Write_Entity ("pipeline", Value.Pipeline); Into.Write_Entity ("result", Value.Result); Into.Write_Entity ("runSummary", Value.Run_Summary); Into.Write_Entity ("startTime", Value.Start_Time); Into.Write_Entity ("state", Value.State); Into.Write_Entity ("type", Value.P_Type); Into.Write_Entity ("commitId", Value.Commit_Id); Into.End_Entity (Name); end Serialize; procedure Serialize (Into : in out Swagger.Streams.Output_Stream'Class; Name : in String; Value : in PipelineRunImpl_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 PipelineRunImpl_Type) is Object : Swagger.Value_Type; begin Swagger.Streams.Deserialize (From, Name, Object); Swagger.Streams.Deserialize (Object, "_class", Value._class); Deserialize (Object, "_links", Value._links); Swagger.Streams.Deserialize (Object, "durationInMillis", Value.Duration_In_Millis); Swagger.Streams.Deserialize (Object, "enQueueTime", Value.En_Queue_Time); Swagger.Streams.Deserialize (Object, "endTime", Value.End_Time); Swagger.Streams.Deserialize (Object, "estimatedDurationInMillis", Value.Estimated_Duration_In_Millis); Swagger.Streams.Deserialize (Object, "id", Value.Id); Swagger.Streams.Deserialize (Object, "organization", Value.Organization); Swagger.Streams.Deserialize (Object, "pipeline", Value.Pipeline); Swagger.Streams.Deserialize (Object, "result", Value.Result); Swagger.Streams.Deserialize (Object, "runSummary", Value.Run_Summary); Swagger.Streams.Deserialize (Object, "startTime", Value.Start_Time); Swagger.Streams.Deserialize (Object, "state", Value.State); Swagger.Streams.Deserialize (Object, "type", Value.P_Type); Swagger.Streams.Deserialize (Object, "commitId", Value.Commit_Id); end Deserialize; procedure Deserialize (From : in Swagger.Value_Type; Name : in String; Value : out PipelineRunImpl_Type_Vectors.Vector) is List : Swagger.Value_Array_Type; Item : PipelineRunImpl_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 GithubRepositorylinks_Type) is begin Into.Start_Entity (Name); Serialize (Into, "self", Value.Self); Into.Write_Entity ("_class", Value._class); Into.End_Entity (Name); end Serialize; procedure Serialize (Into : in out Swagger.Streams.Output_Stream'Class; Name : in String; Value : in GithubRepositorylinks_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 GithubRepositorylinks_Type) is Object : Swagger.Value_Type; begin Swagger.Streams.Deserialize (From, Name, Object); Deserialize (Object, "self", Value.Self); Swagger.Streams.Deserialize (Object, "_class", Value._class); end Deserialize; procedure Deserialize (From : in Swagger.Value_Type; Name : in String; Value : out GithubRepositorylinks_Type_Vectors.Vector) is List : Swagger.Value_Array_Type; Item : GithubRepositorylinks_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 GithubRespositoryContainerlinks_Type) is begin Into.Start_Entity (Name); Serialize (Into, "self", Value.Self); Into.Write_Entity ("_class", Value._class); Into.End_Entity (Name); end Serialize; procedure Serialize (Into : in out Swagger.Streams.Output_Stream'Class; Name : in String; Value : in GithubRespositoryContainerlinks_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 GithubRespositoryContainerlinks_Type) is Object : Swagger.Value_Type; begin Swagger.Streams.Deserialize (From, Name, Object); Deserialize (Object, "self", Value.Self); Swagger.Streams.Deserialize (Object, "_class", Value._class); end Deserialize; procedure Deserialize (From : in Swagger.Value_Type; Name : in String; Value : out GithubRespositoryContainerlinks_Type_Vectors.Vector) is List : Swagger.Value_Array_Type; Item : GithubRespositoryContainerlinks_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 GithubScmlinks_Type) is begin Into.Start_Entity (Name); Serialize (Into, "self", Value.Self); Into.Write_Entity ("_class", Value._class); Into.End_Entity (Name); end Serialize; procedure Serialize (Into : in out Swagger.Streams.Output_Stream'Class; Name : in String; Value : in GithubScmlinks_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 GithubScmlinks_Type) is Object : Swagger.Value_Type; begin Swagger.Streams.Deserialize (From, Name, Object); Deserialize (Object, "self", Value.Self); Swagger.Streams.Deserialize (Object, "_class", Value._class); end Deserialize; procedure Deserialize (From : in Swagger.Value_Type; Name : in String; Value : out GithubScmlinks_Type_Vectors.Vector) is List : Swagger.Value_Array_Type; Item : GithubScmlinks_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 GithubScm_Type) is begin Into.Start_Entity (Name); Into.Write_Entity ("_class", Value._class); Serialize (Into, "_links", Value._links); Into.Write_Entity ("credentialId", Value.Credential_Id); Into.Write_Entity ("id", Value.Id); Into.Write_Entity ("uri", Value.Uri); Into.End_Entity (Name); end Serialize; procedure Serialize (Into : in out Swagger.Streams.Output_Stream'Class; Name : in String; Value : in GithubScm_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 GithubScm_Type) is Object : Swagger.Value_Type; begin Swagger.Streams.Deserialize (From, Name, Object); Swagger.Streams.Deserialize (Object, "_class", Value._class); Deserialize (Object, "_links", Value._links); Swagger.Streams.Deserialize (Object, "credentialId", Value.Credential_Id); Swagger.Streams.Deserialize (Object, "id", Value.Id); Swagger.Streams.Deserialize (Object, "uri", Value.Uri); end Deserialize; procedure Deserialize (From : in Swagger.Value_Type; Name : in String; Value : out GithubScm_Type_Vectors.Vector) is List : Swagger.Value_Array_Type; Item : GithubScm_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 PipelineStepImpllinks_Type) is begin Into.Start_Entity (Name); Serialize (Into, "self", Value.Self); Serialize (Into, "actions", Value.Actions); Into.Write_Entity ("_class", Value._class); Into.End_Entity (Name); end Serialize; procedure Serialize (Into : in out Swagger.Streams.Output_Stream'Class; Name : in String; Value : in PipelineStepImpllinks_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 PipelineStepImpllinks_Type) is Object : Swagger.Value_Type; begin Swagger.Streams.Deserialize (From, Name, Object); Deserialize (Object, "self", Value.Self); Deserialize (Object, "actions", Value.Actions); Swagger.Streams.Deserialize (Object, "_class", Value._class); end Deserialize; procedure Deserialize (From : in Swagger.Value_Type; Name : in String; Value : out PipelineStepImpllinks_Type_Vectors.Vector) is List : Swagger.Value_Array_Type; Item : PipelineStepImpllinks_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 FavoriteImpllinks_Type) is begin Into.Start_Entity (Name); Serialize (Into, "self", Value.Self); Into.Write_Entity ("_class", Value._class); Into.End_Entity (Name); end Serialize; procedure Serialize (Into : in out Swagger.Streams.Output_Stream'Class; Name : in String; Value : in FavoriteImpllinks_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 FavoriteImpllinks_Type) is Object : Swagger.Value_Type; begin Swagger.Streams.Deserialize (From, Name, Object); Deserialize (Object, "self", Value.Self); Swagger.Streams.Deserialize (Object, "_class", Value._class); end Deserialize; procedure Deserialize (From : in Swagger.Value_Type; Name : in String; Value : out FavoriteImpllinks_Type_Vectors.Vector) is List : Swagger.Value_Array_Type; Item : FavoriteImpllinks_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 ExtensionClassImpllinks_Type) is begin Into.Start_Entity (Name); Serialize (Into, "self", Value.Self); Into.Write_Entity ("_class", Value._class); Into.End_Entity (Name); end Serialize; procedure Serialize (Into : in out Swagger.Streams.Output_Stream'Class; Name : in String; Value : in ExtensionClassImpllinks_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 ExtensionClassImpllinks_Type) is Object : Swagger.Value_Type; begin Swagger.Streams.Deserialize (From, Name, Object); Deserialize (Object, "self", Value.Self); Swagger.Streams.Deserialize (Object, "_class", Value._class); end Deserialize; procedure Deserialize (From : in Swagger.Value_Type; Name : in String; Value : out ExtensionClassImpllinks_Type_Vectors.Vector) is List : Swagger.Value_Array_Type; Item : ExtensionClassImpllinks_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 ExtensionClassImpl_Type) is begin Into.Start_Entity (Name); Into.Write_Entity ("_class", Value._class); Serialize (Into, "_links", Value._links); Serialize (Into, "classes", Value.Classes); Into.End_Entity (Name); end Serialize; procedure Serialize (Into : in out Swagger.Streams.Output_Stream'Class; Name : in String; Value : in ExtensionClassImpl_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 ExtensionClassImpl_Type) is Object : Swagger.Value_Type; begin Swagger.Streams.Deserialize (From, Name, Object); Swagger.Streams.Deserialize (Object, "_class", Value._class); Deserialize (Object, "_links", Value._links); Swagger.Streams.Deserialize (Object, "classes", Value.Classes); end Deserialize; procedure Deserialize (From : in Swagger.Value_Type; Name : in String; Value : out ExtensionClassImpl_Type_Vectors.Vector) is List : Swagger.Value_Array_Type; Item : ExtensionClassImpl_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 ExtensionClassContainerImpl1map_Type) is begin Into.Start_Entity (Name); Serialize (Into, "io.jenkins.blueocean.service.embedded.rest.PipelineImpl", Value.Io_Jenkins_Blueocean_Service_Embedded_Rest_Pipeline_Impl); Serialize (Into, "io.jenkins.blueocean.service.embedded.rest.MultiBranchPipelineImpl", Value.Io_Jenkins_Blueocean_Service_Embedded_Rest_Multi_Branch_Pipeline_Impl); Into.Write_Entity ("_class", Value._class); Into.End_Entity (Name); end Serialize; procedure Serialize (Into : in out Swagger.Streams.Output_Stream'Class; Name : in String; Value : in ExtensionClassContainerImpl1map_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 ExtensionClassContainerImpl1map_Type) is Object : Swagger.Value_Type; begin Swagger.Streams.Deserialize (From, Name, Object); Deserialize (Object, "io.jenkins.blueocean.service.embedded.rest.PipelineImpl", Value.Io_Jenkins_Blueocean_Service_Embedded_Rest_Pipeline_Impl); Deserialize (Object, "io.jenkins.blueocean.service.embedded.rest.MultiBranchPipelineImpl", Value.Io_Jenkins_Blueocean_Service_Embedded_Rest_Multi_Branch_Pipeline_Impl); Swagger.Streams.Deserialize (Object, "_class", Value._class); end Deserialize; procedure Deserialize (From : in Swagger.Value_Type; Name : in String; Value : out ExtensionClassContainerImpl1map_Type_Vectors.Vector) is List : Swagger.Value_Array_Type; Item : ExtensionClassContainerImpl1map_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 ExtensionClassContainerImpl1links_Type) is begin Into.Start_Entity (Name); Serialize (Into, "self", Value.Self); Into.Write_Entity ("_class", Value._class); Into.End_Entity (Name); end Serialize; procedure Serialize (Into : in out Swagger.Streams.Output_Stream'Class; Name : in String; Value : in ExtensionClassContainerImpl1links_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 ExtensionClassContainerImpl1links_Type) is Object : Swagger.Value_Type; begin Swagger.Streams.Deserialize (From, Name, Object); Deserialize (Object, "self", Value.Self); Swagger.Streams.Deserialize (Object, "_class", Value._class); end Deserialize; procedure Deserialize (From : in Swagger.Value_Type; Name : in String; Value : out ExtensionClassContainerImpl1links_Type_Vectors.Vector) is List : Swagger.Value_Array_Type; Item : ExtensionClassContainerImpl1links_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 ExtensionClassContainerImpl1_Type) is begin Into.Start_Entity (Name); Into.Write_Entity ("_class", Value._class); Serialize (Into, "_links", Value._links); Serialize (Into, "map", Value.Map); Into.End_Entity (Name); end Serialize; procedure Serialize (Into : in out Swagger.Streams.Output_Stream'Class; Name : in String; Value : in ExtensionClassContainerImpl1_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 ExtensionClassContainerImpl1_Type) is Object : Swagger.Value_Type; begin Swagger.Streams.Deserialize (From, Name, Object); Swagger.Streams.Deserialize (Object, "_class", Value._class); Deserialize (Object, "_links", Value._links); Deserialize (Object, "map", Value.Map); end Deserialize; procedure Deserialize (From : in Swagger.Value_Type; Name : in String; Value : out ExtensionClassContainerImpl1_Type_Vectors.Vector) is List : Swagger.Value_Array_Type; Item : ExtensionClassContainerImpl1_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 PipelineImpllinks_Type) is begin Into.Start_Entity (Name); Serialize (Into, "runs", Value.Runs); Serialize (Into, "self", Value.Self); Serialize (Into, "queue", Value.Queue); Serialize (Into, "actions", Value.Actions); Into.Write_Entity ("_class", Value._class); Into.End_Entity (Name); end Serialize; procedure Serialize (Into : in out Swagger.Streams.Output_Stream'Class; Name : in String; Value : in PipelineImpllinks_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 PipelineImpllinks_Type) is Object : Swagger.Value_Type; begin Swagger.Streams.Deserialize (From, Name, Object); Deserialize (Object, "runs", Value.Runs); Deserialize (Object, "self", Value.Self); Deserialize (Object, "queue", Value.Queue); Deserialize (Object, "actions", Value.Actions); Swagger.Streams.Deserialize (Object, "_class", Value._class); end Deserialize; procedure Deserialize (From : in Swagger.Value_Type; Name : in String; Value : out PipelineImpllinks_Type_Vectors.Vector) is List : Swagger.Value_Array_Type; Item : PipelineImpllinks_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 PipelineImpl_Type) is begin Into.Start_Entity (Name); Into.Write_Entity ("_class", Value._class); Into.Write_Entity ("displayName", Value.Display_Name); Into.Write_Entity ("estimatedDurationInMillis", Value.Estimated_Duration_In_Millis); Into.Write_Entity ("fullName", Value.Full_Name); Into.Write_Entity ("latestRun", Value.Latest_Run); Into.Write_Entity ("name", Value.Name); Into.Write_Entity ("organization", Value.Organization); Into.Write_Entity ("weatherScore", Value.Weather_Score); Serialize (Into, "_links", Value._links); Into.End_Entity (Name); end Serialize; procedure Serialize (Into : in out Swagger.Streams.Output_Stream'Class; Name : in String; Value : in PipelineImpl_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 PipelineImpl_Type) is Object : Swagger.Value_Type; begin Swagger.Streams.Deserialize (From, Name, Object); Swagger.Streams.Deserialize (Object, "_class", Value._class); Swagger.Streams.Deserialize (Object, "displayName", Value.Display_Name); Swagger.Streams.Deserialize (Object, "estimatedDurationInMillis", Value.Estimated_Duration_In_Millis); Swagger.Streams.Deserialize (Object, "fullName", Value.Full_Name); Swagger.Streams.Deserialize (Object, "latestRun", Value.Latest_Run); Swagger.Streams.Deserialize (Object, "name", Value.Name); Swagger.Streams.Deserialize (Object, "organization", Value.Organization); Swagger.Streams.Deserialize (Object, "weatherScore", Value.Weather_Score); Deserialize (Object, "_links", Value._links); end Deserialize; procedure Deserialize (From : in Swagger.Value_Type; Name : in String; Value : out PipelineImpl_Type_Vectors.Vector) is List : Swagger.Value_Array_Type; Item : PipelineImpl_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 FavoriteImpl_Type) is begin Into.Start_Entity (Name); Into.Write_Entity ("_class", Value._class); Serialize (Into, "_links", Value._links); Serialize (Into, "item", Value.Item); Into.End_Entity (Name); end Serialize; procedure Serialize (Into : in out Swagger.Streams.Output_Stream'Class; Name : in String; Value : in FavoriteImpl_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 FavoriteImpl_Type) is Object : Swagger.Value_Type; begin Swagger.Streams.Deserialize (From, Name, Object); Swagger.Streams.Deserialize (Object, "_class", Value._class); Deserialize (Object, "_links", Value._links); Deserialize (Object, "item", Value.Item); end Deserialize; procedure Deserialize (From : in Swagger.Value_Type; Name : in String; Value : out FavoriteImpl_Type_Vectors.Vector) is List : Swagger.Value_Array_Type; Item : FavoriteImpl_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 InputStepImpllinks_Type) is begin Into.Start_Entity (Name); Serialize (Into, "self", Value.Self); Into.Write_Entity ("_class", Value._class); Into.End_Entity (Name); end Serialize; procedure Serialize (Into : in out Swagger.Streams.Output_Stream'Class; Name : in String; Value : in InputStepImpllinks_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 InputStepImpllinks_Type) is Object : Swagger.Value_Type; begin Swagger.Streams.Deserialize (From, Name, Object); Deserialize (Object, "self", Value.Self); Swagger.Streams.Deserialize (Object, "_class", Value._class); end Deserialize; procedure Deserialize (From : in Swagger.Value_Type; Name : in String; Value : out InputStepImpllinks_Type_Vectors.Vector) is List : Swagger.Value_Array_Type; Item : InputStepImpllinks_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 GithubRepositorieslinks_Type) is begin Into.Start_Entity (Name); Serialize (Into, "self", Value.Self); Into.Write_Entity ("_class", Value._class); Into.End_Entity (Name); end Serialize; procedure Serialize (Into : in out Swagger.Streams.Output_Stream'Class; Name : in String; Value : in GithubRepositorieslinks_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 GithubRepositorieslinks_Type) is Object : Swagger.Value_Type; begin Swagger.Streams.Deserialize (From, Name, Object); Deserialize (Object, "self", Value.Self); Swagger.Streams.Deserialize (Object, "_class", Value._class); end Deserialize; procedure Deserialize (From : in Swagger.Value_Type; Name : in String; Value : out GithubRepositorieslinks_Type_Vectors.Vector) is List : Swagger.Value_Array_Type; Item : GithubRepositorieslinks_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 GithubOrganizationlinks_Type) is begin Into.Start_Entity (Name); Serialize (Into, "repositories", Value.Repositories); Serialize (Into, "self", Value.Self); Into.Write_Entity ("_class", Value._class); Into.End_Entity (Name); end Serialize; procedure Serialize (Into : in out Swagger.Streams.Output_Stream'Class; Name : in String; Value : in GithubOrganizationlinks_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 GithubOrganizationlinks_Type) is Object : Swagger.Value_Type; begin Swagger.Streams.Deserialize (From, Name, Object); Deserialize (Object, "repositories", Value.Repositories); Deserialize (Object, "self", Value.Self); Swagger.Streams.Deserialize (Object, "_class", Value._class); end Deserialize; procedure Deserialize (From : in Swagger.Value_Type; Name : in String; Value : out GithubOrganizationlinks_Type_Vectors.Vector) is List : Swagger.Value_Array_Type; Item : GithubOrganizationlinks_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 GithubOrganization_Type) is begin Into.Start_Entity (Name); Into.Write_Entity ("_class", Value._class); Serialize (Into, "_links", Value._links); Into.Write_Entity ("jenkinsOrganizationPipeline", Value.Jenkins_Organization_Pipeline); 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 GithubOrganization_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 GithubOrganization_Type) is Object : Swagger.Value_Type; begin Swagger.Streams.Deserialize (From, Name, Object); Swagger.Streams.Deserialize (Object, "_class", Value._class); Deserialize (Object, "_links", Value._links); Swagger.Streams.Deserialize (Object, "jenkinsOrganizationPipeline", Value.Jenkins_Organization_Pipeline); Swagger.Streams.Deserialize (Object, "name", Value.Name); end Deserialize; procedure Deserialize (From : in Swagger.Value_Type; Name : in String; Value : out GithubOrganization_Type_Vectors.Vector) is List : Swagger.Value_Array_Type; Item : GithubOrganization_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 BranchImpllinks_Type) is begin Into.Start_Entity (Name); Serialize (Into, "self", Value.Self); Serialize (Into, "actions", Value.Actions); Serialize (Into, "runs", Value.Runs); Serialize (Into, "queue", Value.Queue); Into.Write_Entity ("_class", Value._class); Into.End_Entity (Name); end Serialize; procedure Serialize (Into : in out Swagger.Streams.Output_Stream'Class; Name : in String; Value : in BranchImpllinks_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 BranchImpllinks_Type) is Object : Swagger.Value_Type; begin Swagger.Streams.Deserialize (From, Name, Object); Deserialize (Object, "self", Value.Self); Deserialize (Object, "actions", Value.Actions); Deserialize (Object, "runs", Value.Runs); Deserialize (Object, "queue", Value.Queue); Swagger.Streams.Deserialize (Object, "_class", Value._class); end Deserialize; procedure Deserialize (From : in Swagger.Value_Type; Name : in String; Value : out BranchImpllinks_Type_Vectors.Vector) is List : Swagger.Value_Array_Type; Item : BranchImpllinks_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 NullSCM_Type) is begin Into.Start_Entity (Name); Into.Write_Entity ("_class", Value._class); Into.End_Entity (Name); end Serialize; procedure Serialize (Into : in out Swagger.Streams.Output_Stream'Class; Name : in String; Value : in NullSCM_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 NullSCM_Type) is Object : Swagger.Value_Type; begin Swagger.Streams.Deserialize (From, Name, Object); Swagger.Streams.Deserialize (Object, "_class", Value._class); end Deserialize; procedure Deserialize (From : in Swagger.Value_Type; Name : in String; Value : out NullSCM_Type_Vectors.Vector) is List : Swagger.Value_Array_Type; Item : NullSCM_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 FreeStyleProjectactions_Type) is begin Into.Start_Entity (Name); Into.Write_Entity ("_class", Value._class); Into.End_Entity (Name); end Serialize; procedure Serialize (Into : in out Swagger.Streams.Output_Stream'Class; Name : in String; Value : in FreeStyleProjectactions_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 FreeStyleProjectactions_Type) is Object : Swagger.Value_Type; begin Swagger.Streams.Deserialize (From, Name, Object); Swagger.Streams.Deserialize (Object, "_class", Value._class); end Deserialize; procedure Deserialize (From : in Swagger.Value_Type; Name : in String; Value : out FreeStyleProjectactions_Type_Vectors.Vector) is List : Swagger.Value_Array_Type; Item : FreeStyleProjectactions_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 UnlabeledLoadStatistics_Type) is begin Into.Start_Entity (Name); Into.Write_Entity ("_class", Value._class); Into.End_Entity (Name); end Serialize; procedure Serialize (Into : in out Swagger.Streams.Output_Stream'Class; Name : in String; Value : in UnlabeledLoadStatistics_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 UnlabeledLoadStatistics_Type) is Object : Swagger.Value_Type; begin Swagger.Streams.Deserialize (From, Name, Object); Swagger.Streams.Deserialize (Object, "_class", Value._class); end Deserialize; procedure Deserialize (From : in Swagger.Value_Type; Name : in String; Value : out UnlabeledLoadStatistics_Type_Vectors.Vector) is List : Swagger.Value_Array_Type; Item : UnlabeledLoadStatistics_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 DefaultCrumbIssuer_Type) is begin Into.Start_Entity (Name); Into.Write_Entity ("_class", Value._class); Into.Write_Entity ("crumb", Value.Crumb); Into.Write_Entity ("crumbRequestField", Value.Crumb_Request_Field); Into.End_Entity (Name); end Serialize; procedure Serialize (Into : in out Swagger.Streams.Output_Stream'Class; Name : in String; Value : in DefaultCrumbIssuer_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 DefaultCrumbIssuer_Type) is Object : Swagger.Value_Type; begin Swagger.Streams.Deserialize (From, Name, Object); Swagger.Streams.Deserialize (Object, "_class", Value._class); Swagger.Streams.Deserialize (Object, "crumb", Value.Crumb); Swagger.Streams.Deserialize (Object, "crumbRequestField", Value.Crumb_Request_Field); end Deserialize; procedure Deserialize (From : in Swagger.Value_Type; Name : in String; Value : out DefaultCrumbIssuer_Type_Vectors.Vector) is List : Swagger.Value_Array_Type; Item : DefaultCrumbIssuer_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 ClockDifference_Type) is begin Into.Start_Entity (Name); Into.Write_Entity ("_class", Value._class); Into.Write_Entity ("diff", Value.Diff); Into.End_Entity (Name); end Serialize; procedure Serialize (Into : in out Swagger.Streams.Output_Stream'Class; Name : in String; Value : in ClockDifference_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 ClockDifference_Type) is Object : Swagger.Value_Type; begin Swagger.Streams.Deserialize (From, Name, Object); Swagger.Streams.Deserialize (Object, "_class", Value._class); Swagger.Streams.Deserialize (Object, "diff", Value.Diff); end Deserialize; procedure Deserialize (From : in Swagger.Value_Type; Name : in String; Value : out ClockDifference_Type_Vectors.Vector) is List : Swagger.Value_Array_Type; Item : ClockDifference_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 DiskSpaceMonitorDescriptorDiskSpace_Type) is begin Into.Start_Entity (Name); Into.Write_Entity ("_class", Value._class); Into.Write_Entity ("timestamp", Value.Timestamp); Into.Write_Entity ("path", Value.Path); Into.Write_Entity ("size", Value.Size); Into.End_Entity (Name); end Serialize; procedure Serialize (Into : in out Swagger.Streams.Output_Stream'Class; Name : in String; Value : in DiskSpaceMonitorDescriptorDiskSpace_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 DiskSpaceMonitorDescriptorDiskSpace_Type) is Object : Swagger.Value_Type; begin Swagger.Streams.Deserialize (From, Name, Object); Swagger.Streams.Deserialize (Object, "_class", Value._class); Swagger.Streams.Deserialize (Object, "timestamp", Value.Timestamp); Swagger.Streams.Deserialize (Object, "path", Value.Path); Swagger.Streams.Deserialize (Object, "size", Value.Size); end Deserialize; procedure Deserialize (From : in Swagger.Value_Type; Name : in String; Value : out DiskSpaceMonitorDescriptorDiskSpace_Type_Vectors.Vector) is List : Swagger.Value_Array_Type; Item : DiskSpaceMonitorDescriptorDiskSpace_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 Label1_Type) is begin Into.Start_Entity (Name); Into.Write_Entity ("_class", Value._class); Into.End_Entity (Name); end Serialize; procedure Serialize (Into : in out Swagger.Streams.Output_Stream'Class; Name : in String; Value : in Label1_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 Label1_Type) is Object : Swagger.Value_Type; begin Swagger.Streams.Deserialize (From, Name, Object); Swagger.Streams.Deserialize (Object, "_class", Value._class); end Deserialize; procedure Deserialize (From : in Swagger.Value_Type; Name : in String; Value : out Label1_Type_Vectors.Vector) is List : Swagger.Value_Array_Type; Item : Label1_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 SwapSpaceMonitorMemoryUsage2_Type) is begin Into.Start_Entity (Name); Into.Write_Entity ("_class", Value._class); Into.Write_Entity ("availablePhysicalMemory", Value.Available_Physical_Memory); Into.Write_Entity ("availableSwapSpace", Value.Available_Swap_Space); Into.Write_Entity ("totalPhysicalMemory", Value.Total_Physical_Memory); Into.Write_Entity ("totalSwapSpace", Value.Total_Swap_Space); Into.End_Entity (Name); end Serialize; procedure Serialize (Into : in out Swagger.Streams.Output_Stream'Class; Name : in String; Value : in SwapSpaceMonitorMemoryUsage2_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 SwapSpaceMonitorMemoryUsage2_Type) is Object : Swagger.Value_Type; begin Swagger.Streams.Deserialize (From, Name, Object); Swagger.Streams.Deserialize (Object, "_class", Value._class); Swagger.Streams.Deserialize (Object, "availablePhysicalMemory", Value.Available_Physical_Memory); Swagger.Streams.Deserialize (Object, "availableSwapSpace", Value.Available_Swap_Space); Swagger.Streams.Deserialize (Object, "totalPhysicalMemory", Value.Total_Physical_Memory); Swagger.Streams.Deserialize (Object, "totalSwapSpace", Value.Total_Swap_Space); end Deserialize; procedure Deserialize (From : in Swagger.Value_Type; Name : in String; Value : out SwapSpaceMonitorMemoryUsage2_Type_Vectors.Vector) is List : Swagger.Value_Array_Type; Item : SwapSpaceMonitorMemoryUsage2_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 ResponseTimeMonitorData_Type) is begin Into.Start_Entity (Name); Into.Write_Entity ("_class", Value._class); Into.Write_Entity ("timestamp", Value.Timestamp); Into.Write_Entity ("average", Value.Average); Into.End_Entity (Name); end Serialize; procedure Serialize (Into : in out Swagger.Streams.Output_Stream'Class; Name : in String; Value : in ResponseTimeMonitorData_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 ResponseTimeMonitorData_Type) is Object : Swagger.Value_Type; begin Swagger.Streams.Deserialize (From, Name, Object); Swagger.Streams.Deserialize (Object, "_class", Value._class); Swagger.Streams.Deserialize (Object, "timestamp", Value.Timestamp); Swagger.Streams.Deserialize (Object, "average", Value.Average); end Deserialize; procedure Deserialize (From : in Swagger.Value_Type; Name : in String; Value : out ResponseTimeMonitorData_Type_Vectors.Vector) is List : Swagger.Value_Array_Type; Item : ResponseTimeMonitorData_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 HudsonMasterComputermonitorData_Type) is begin Into.Start_Entity (Name); Serialize (Into, "hudson.node_monitors.SwapSpaceMonitor", Value.Hudson_Node_Monitors_Swap_Space_Monitor); Serialize (Into, "hudson.node_monitors.TemporarySpaceMonitor", Value.Hudson_Node_Monitors_Temporary_Space_Monitor); Serialize (Into, "hudson.node_monitors.DiskSpaceMonitor", Value.Hudson_Node_Monitors_Disk_Space_Monitor); Into.Write_Entity ("hudson.node_monitors.ArchitectureMonitor", Value.Hudson_Node_Monitors_Architecture_Monitor); Serialize (Into, "hudson.node_monitors.ResponseTimeMonitor", Value.Hudson_Node_Monitors_Response_Time_Monitor); Serialize (Into, "hudson.node_monitors.ClockMonitor", Value.Hudson_Node_Monitors_Clock_Monitor); Into.Write_Entity ("_class", Value._class); Into.End_Entity (Name); end Serialize; procedure Serialize (Into : in out Swagger.Streams.Output_Stream'Class; Name : in String; Value : in HudsonMasterComputermonitorData_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 HudsonMasterComputermonitorData_Type) is Object : Swagger.Value_Type; begin Swagger.Streams.Deserialize (From, Name, Object); Deserialize (Object, "hudson.node_monitors.SwapSpaceMonitor", Value.Hudson_Node_Monitors_Swap_Space_Monitor); Deserialize (Object, "hudson.node_monitors.TemporarySpaceMonitor", Value.Hudson_Node_Monitors_Temporary_Space_Monitor); Deserialize (Object, "hudson.node_monitors.DiskSpaceMonitor", Value.Hudson_Node_Monitors_Disk_Space_Monitor); Swagger.Streams.Deserialize (Object, "hudson.node_monitors.ArchitectureMonitor", Value.Hudson_Node_Monitors_Architecture_Monitor); Deserialize (Object, "hudson.node_monitors.ResponseTimeMonitor", Value.Hudson_Node_Monitors_Response_Time_Monitor); Deserialize (Object, "hudson.node_monitors.ClockMonitor", Value.Hudson_Node_Monitors_Clock_Monitor); Swagger.Streams.Deserialize (Object, "_class", Value._class); end Deserialize; procedure Deserialize (From : in Swagger.Value_Type; Name : in String; Value : out HudsonMasterComputermonitorData_Type_Vectors.Vector) is List : Swagger.Value_Array_Type; Item : HudsonMasterComputermonitorData_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 HudsonassignedLabels_Type) is begin Into.Start_Entity (Name); Into.Write_Entity ("_class", Value._class); Into.End_Entity (Name); end Serialize; procedure Serialize (Into : in out Swagger.Streams.Output_Stream'Class; Name : in String; Value : in HudsonassignedLabels_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 HudsonassignedLabels_Type) is Object : Swagger.Value_Type; begin Swagger.Streams.Deserialize (From, Name, Object); Swagger.Streams.Deserialize (Object, "_class", Value._class); end Deserialize; procedure Deserialize (From : in Swagger.Value_Type; Name : in String; Value : out HudsonassignedLabels_Type_Vectors.Vector) is List : Swagger.Value_Array_Type; Item : HudsonassignedLabels_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 AllView_Type) is begin Into.Start_Entity (Name); Into.Write_Entity ("_class", Value._class); Into.Write_Entity ("name", Value.Name); Into.Write_Entity ("url", Value.Url); Into.End_Entity (Name); end Serialize; procedure Serialize (Into : in out Swagger.Streams.Output_Stream'Class; Name : in String; Value : in AllView_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 AllView_Type) is Object : Swagger.Value_Type; begin Swagger.Streams.Deserialize (From, Name, Object); Swagger.Streams.Deserialize (Object, "_class", Value._class); Swagger.Streams.Deserialize (Object, "name", Value.Name); Swagger.Streams.Deserialize (Object, "url", Value.Url); end Deserialize; procedure Deserialize (From : in Swagger.Value_Type; Name : in String; Value : out AllView_Type_Vectors.Vector) is List : Swagger.Value_Array_Type; Item : AllView_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 FreeStyleProjecthealthReport_Type) is begin Into.Start_Entity (Name); Into.Write_Entity ("description", Value.Description); Into.Write_Entity ("iconClassName", Value.Icon_Class_Name); Into.Write_Entity ("iconUrl", Value.Icon_Url); Into.Write_Entity ("score", Value.Score); Into.Write_Entity ("_class", Value._class); Into.End_Entity (Name); end Serialize; procedure Serialize (Into : in out Swagger.Streams.Output_Stream'Class; Name : in String; Value : in FreeStyleProjecthealthReport_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 FreeStyleProjecthealthReport_Type) is Object : Swagger.Value_Type; begin Swagger.Streams.Deserialize (From, Name, Object); Swagger.Streams.Deserialize (Object, "description", Value.Description); Swagger.Streams.Deserialize (Object, "iconClassName", Value.Icon_Class_Name); Swagger.Streams.Deserialize (Object, "iconUrl", Value.Icon_Url); Swagger.Streams.Deserialize (Object, "score", Value.Score); Swagger.Streams.Deserialize (Object, "_class", Value._class); end Deserialize; procedure Deserialize (From : in Swagger.Value_Type; Name : in String; Value : out FreeStyleProjecthealthReport_Type_Vectors.Vector) is List : Swagger.Value_Array_Type; Item : FreeStyleProjecthealthReport_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 CauseUserIdCause_Type) is begin Into.Start_Entity (Name); Into.Write_Entity ("_class", Value._class); Into.Write_Entity ("shortDescription", Value.Short_Description); Into.Write_Entity ("userId", Value.User_Id); Into.Write_Entity ("userName", Value.User_Name); Into.End_Entity (Name); end Serialize; procedure Serialize (Into : in out Swagger.Streams.Output_Stream'Class; Name : in String; Value : in CauseUserIdCause_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 CauseUserIdCause_Type) is Object : Swagger.Value_Type; begin Swagger.Streams.Deserialize (From, Name, Object); Swagger.Streams.Deserialize (Object, "_class", Value._class); Swagger.Streams.Deserialize (Object, "shortDescription", Value.Short_Description); Swagger.Streams.Deserialize (Object, "userId", Value.User_Id); Swagger.Streams.Deserialize (Object, "userName", Value.User_Name); end Deserialize; procedure Deserialize (From : in Swagger.Value_Type; Name : in String; Value : out CauseUserIdCause_Type_Vectors.Vector) is List : Swagger.Value_Array_Type; Item : CauseUserIdCause_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 CauseAction_Type) is begin Into.Start_Entity (Name); Into.Write_Entity ("_class", Value._class); Serialize (Into, "causes", Value.Causes); Into.End_Entity (Name); end Serialize; procedure Serialize (Into : in out Swagger.Streams.Output_Stream'Class; Name : in String; Value : in CauseAction_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 CauseAction_Type) is Object : Swagger.Value_Type; begin Swagger.Streams.Deserialize (From, Name, Object); Swagger.Streams.Deserialize (Object, "_class", Value._class); Deserialize (Object, "causes", Value.Causes); end Deserialize; procedure Deserialize (From : in Swagger.Value_Type; Name : in String; Value : out CauseAction_Type_Vectors.Vector) is List : Swagger.Value_Array_Type; Item : CauseAction_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 EmptyChangeLogSet_Type) is begin Into.Start_Entity (Name); Into.Write_Entity ("_class", Value._class); Into.Write_Entity ("kind", Value.Kind); Into.End_Entity (Name); end Serialize; procedure Serialize (Into : in out Swagger.Streams.Output_Stream'Class; Name : in String; Value : in EmptyChangeLogSet_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 EmptyChangeLogSet_Type) is Object : Swagger.Value_Type; begin Swagger.Streams.Deserialize (From, Name, Object); Swagger.Streams.Deserialize (Object, "_class", Value._class); Swagger.Streams.Deserialize (Object, "kind", Value.Kind); end Deserialize; procedure Deserialize (From : in Swagger.Value_Type; Name : in String; Value : out EmptyChangeLogSet_Type_Vectors.Vector) is List : Swagger.Value_Array_Type; Item : EmptyChangeLogSet_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 FreeStyleBuild_Type) is begin Into.Start_Entity (Name); Into.Write_Entity ("_class", Value._class); Into.Write_Entity ("number", Value.Number); Into.Write_Entity ("url", Value.Url); Serialize (Into, "actions", Value.Actions); Into.Write_Entity ("building", Value.Building); Into.Write_Entity ("description", Value.Description); Into.Write_Entity ("displayName", Value.Display_Name); Into.Write_Entity ("duration", Value.Duration); Into.Write_Entity ("estimatedDuration", Value.Estimated_Duration); Into.Write_Entity ("executor", Value.Executor); Into.Write_Entity ("fullDisplayName", Value.Full_Display_Name); Into.Write_Entity ("id", Value.Id); Into.Write_Entity ("keepLog", Value.Keep_Log); Into.Write_Entity ("queueId", Value.Queue_Id); Into.Write_Entity ("result", Value.Result); Into.Write_Entity ("timestamp", Value.Timestamp); Into.Write_Entity ("builtOn", Value.Built_On); Serialize (Into, "changeSet", Value.Change_Set); Into.End_Entity (Name); end Serialize; procedure Serialize (Into : in out Swagger.Streams.Output_Stream'Class; Name : in String; Value : in FreeStyleBuild_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 FreeStyleBuild_Type) is Object : Swagger.Value_Type; begin Swagger.Streams.Deserialize (From, Name, Object); Swagger.Streams.Deserialize (Object, "_class", Value._class); Swagger.Streams.Deserialize (Object, "number", Value.Number); Swagger.Streams.Deserialize (Object, "url", Value.Url); Deserialize (Object, "actions", Value.Actions); Swagger.Streams.Deserialize (Object, "building", Value.Building); Swagger.Streams.Deserialize (Object, "description", Value.Description); Swagger.Streams.Deserialize (Object, "displayName", Value.Display_Name); Swagger.Streams.Deserialize (Object, "duration", Value.Duration); Swagger.Streams.Deserialize (Object, "estimatedDuration", Value.Estimated_Duration); Swagger.Streams.Deserialize (Object, "executor", Value.Executor); Swagger.Streams.Deserialize (Object, "fullDisplayName", Value.Full_Display_Name); Swagger.Streams.Deserialize (Object, "id", Value.Id); Swagger.Streams.Deserialize (Object, "keepLog", Value.Keep_Log); Swagger.Streams.Deserialize (Object, "queueId", Value.Queue_Id); Swagger.Streams.Deserialize (Object, "result", Value.Result); Swagger.Streams.Deserialize (Object, "timestamp", Value.Timestamp); Swagger.Streams.Deserialize (Object, "builtOn", Value.Built_On); Deserialize (Object, "changeSet", Value.Change_Set); end Deserialize; procedure Deserialize (From : in Swagger.Value_Type; Name : in String; Value : out FreeStyleBuild_Type_Vectors.Vector) is List : Swagger.Value_Array_Type; Item : FreeStyleBuild_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 FreeStyleProject_Type) is begin Into.Start_Entity (Name); Into.Write_Entity ("_class", Value._class); Into.Write_Entity ("name", Value.Name); Into.Write_Entity ("url", Value.Url); Into.Write_Entity ("color", Value.Color); Serialize (Into, "actions", Value.Actions); Into.Write_Entity ("description", Value.Description); Into.Write_Entity ("displayName", Value.Display_Name); Into.Write_Entity ("displayNameOrNull", Value.Display_Name_Or_Null); Into.Write_Entity ("fullDisplayName", Value.Full_Display_Name); Into.Write_Entity ("fullName", Value.Full_Name); Into.Write_Entity ("buildable", Value.Buildable); Serialize (Into, "builds", Value.Builds); Serialize (Into, "firstBuild", Value.First_Build); Serialize (Into, "healthReport", Value.Health_Report); Into.Write_Entity ("inQueue", Value.In_Queue); Into.Write_Entity ("keepDependencies", Value.Keep_Dependencies); Serialize (Into, "lastBuild", Value.Last_Build); Serialize (Into, "lastCompletedBuild", Value.Last_Completed_Build); Into.Write_Entity ("lastFailedBuild", Value.Last_Failed_Build); Serialize (Into, "lastStableBuild", Value.Last_Stable_Build); Serialize (Into, "lastSuccessfulBuild", Value.Last_Successful_Build); Into.Write_Entity ("lastUnstableBuild", Value.Last_Unstable_Build); Into.Write_Entity ("lastUnsuccessfulBuild", Value.Last_Unsuccessful_Build); Into.Write_Entity ("nextBuildNumber", Value.Next_Build_Number); Into.Write_Entity ("queueItem", Value.Queue_Item); Into.Write_Entity ("concurrentBuild", Value.Concurrent_Build); Serialize (Into, "scm", Value.Scm); Into.End_Entity (Name); end Serialize; procedure Serialize (Into : in out Swagger.Streams.Output_Stream'Class; Name : in String; Value : in FreeStyleProject_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 FreeStyleProject_Type) is Object : Swagger.Value_Type; begin Swagger.Streams.Deserialize (From, Name, Object); Swagger.Streams.Deserialize (Object, "_class", Value._class); Swagger.Streams.Deserialize (Object, "name", Value.Name); Swagger.Streams.Deserialize (Object, "url", Value.Url); Swagger.Streams.Deserialize (Object, "color", Value.Color); Deserialize (Object, "actions", Value.Actions); Swagger.Streams.Deserialize (Object, "description", Value.Description); Swagger.Streams.Deserialize (Object, "displayName", Value.Display_Name); Swagger.Streams.Deserialize (Object, "displayNameOrNull", Value.Display_Name_Or_Null); Swagger.Streams.Deserialize (Object, "fullDisplayName", Value.Full_Display_Name); Swagger.Streams.Deserialize (Object, "fullName", Value.Full_Name); Swagger.Streams.Deserialize (Object, "buildable", Value.Buildable); Deserialize (Object, "builds", Value.Builds); Deserialize (Object, "firstBuild", Value.First_Build); Deserialize (Object, "healthReport", Value.Health_Report); Swagger.Streams.Deserialize (Object, "inQueue", Value.In_Queue); Swagger.Streams.Deserialize (Object, "keepDependencies", Value.Keep_Dependencies); Deserialize (Object, "lastBuild", Value.Last_Build); Deserialize (Object, "lastCompletedBuild", Value.Last_Completed_Build); Swagger.Streams.Deserialize (Object, "lastFailedBuild", Value.Last_Failed_Build); Deserialize (Object, "lastStableBuild", Value.Last_Stable_Build); Deserialize (Object, "lastSuccessfulBuild", Value.Last_Successful_Build); Swagger.Streams.Deserialize (Object, "lastUnstableBuild", Value.Last_Unstable_Build); Swagger.Streams.Deserialize (Object, "lastUnsuccessfulBuild", Value.Last_Unsuccessful_Build); Swagger.Streams.Deserialize (Object, "nextBuildNumber", Value.Next_Build_Number); Swagger.Streams.Deserialize (Object, "queueItem", Value.Queue_Item); Swagger.Streams.Deserialize (Object, "concurrentBuild", Value.Concurrent_Build); Deserialize (Object, "scm", Value.Scm); end Deserialize; procedure Deserialize (From : in Swagger.Value_Type; Name : in String; Value : out FreeStyleProject_Type_Vectors.Vector) is List : Swagger.Value_Array_Type; Item : FreeStyleProject_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 QueueLeftItem_Type) is begin Into.Start_Entity (Name); Into.Write_Entity ("_class", Value._class); Serialize (Into, "actions", Value.Actions); Into.Write_Entity ("blocked", Value.Blocked); Into.Write_Entity ("buildable", Value.Buildable); Into.Write_Entity ("id", Value.Id); Into.Write_Entity ("inQueueSince", Value.In_Queue_Since); Into.Write_Entity ("params", Value.Params); Into.Write_Entity ("stuck", Value.Stuck); Serialize (Into, "task", Value.P_Task); Into.Write_Entity ("url", Value.Url); Into.Write_Entity ("why", Value.Why); Into.Write_Entity ("cancelled", Value.Cancelled); Serialize (Into, "executable", Value.Executable); Into.End_Entity (Name); end Serialize; procedure Serialize (Into : in out Swagger.Streams.Output_Stream'Class; Name : in String; Value : in QueueLeftItem_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 QueueLeftItem_Type) is Object : Swagger.Value_Type; begin Swagger.Streams.Deserialize (From, Name, Object); Swagger.Streams.Deserialize (Object, "_class", Value._class); Deserialize (Object, "actions", Value.Actions); Swagger.Streams.Deserialize (Object, "blocked", Value.Blocked); Swagger.Streams.Deserialize (Object, "buildable", Value.Buildable); Swagger.Streams.Deserialize (Object, "id", Value.Id); Swagger.Streams.Deserialize (Object, "inQueueSince", Value.In_Queue_Since); Swagger.Streams.Deserialize (Object, "params", Value.Params); Swagger.Streams.Deserialize (Object, "stuck", Value.Stuck); Deserialize (Object, "task", Value.P_Task); Swagger.Streams.Deserialize (Object, "url", Value.Url); Swagger.Streams.Deserialize (Object, "why", Value.Why); Swagger.Streams.Deserialize (Object, "cancelled", Value.Cancelled); Deserialize (Object, "executable", Value.Executable); end Deserialize; procedure Deserialize (From : in Swagger.Value_Type; Name : in String; Value : out QueueLeftItem_Type_Vectors.Vector) is List : Swagger.Value_Array_Type; Item : QueueLeftItem_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 QueueBlockedItem_Type) is begin Into.Start_Entity (Name); Into.Write_Entity ("_class", Value._class); Serialize (Into, "actions", Value.Actions); Into.Write_Entity ("blocked", Value.Blocked); Into.Write_Entity ("buildable", Value.Buildable); Into.Write_Entity ("id", Value.Id); Into.Write_Entity ("inQueueSince", Value.In_Queue_Since); Into.Write_Entity ("params", Value.Params); Into.Write_Entity ("stuck", Value.Stuck); Serialize (Into, "task", Value.P_Task); Into.Write_Entity ("url", Value.Url); Into.Write_Entity ("why", Value.Why); Into.Write_Entity ("buildableStartMilliseconds", Value.Buildable_Start_Milliseconds); Into.End_Entity (Name); end Serialize; procedure Serialize (Into : in out Swagger.Streams.Output_Stream'Class; Name : in String; Value : in QueueBlockedItem_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 QueueBlockedItem_Type) is Object : Swagger.Value_Type; begin Swagger.Streams.Deserialize (From, Name, Object); Swagger.Streams.Deserialize (Object, "_class", Value._class); Deserialize (Object, "actions", Value.Actions); Swagger.Streams.Deserialize (Object, "blocked", Value.Blocked); Swagger.Streams.Deserialize (Object, "buildable", Value.Buildable); Swagger.Streams.Deserialize (Object, "id", Value.Id); Swagger.Streams.Deserialize (Object, "inQueueSince", Value.In_Queue_Since); Swagger.Streams.Deserialize (Object, "params", Value.Params); Swagger.Streams.Deserialize (Object, "stuck", Value.Stuck); Deserialize (Object, "task", Value.P_Task); Swagger.Streams.Deserialize (Object, "url", Value.Url); Swagger.Streams.Deserialize (Object, "why", Value.Why); Swagger.Streams.Deserialize (Object, "buildableStartMilliseconds", Value.Buildable_Start_Milliseconds); end Deserialize; procedure Deserialize (From : in Swagger.Value_Type; Name : in String; Value : out QueueBlockedItem_Type_Vectors.Vector) is List : Swagger.Value_Array_Type; Item : QueueBlockedItem_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 Queue_Type) is begin Into.Start_Entity (Name); Into.Write_Entity ("_class", Value._class); Serialize (Into, "items", Value.Items); Into.End_Entity (Name); end Serialize; procedure Serialize (Into : in out Swagger.Streams.Output_Stream'Class; Name : in String; Value : in Queue_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 Queue_Type) is Object : Swagger.Value_Type; begin Swagger.Streams.Deserialize (From, Name, Object); Swagger.Streams.Deserialize (Object, "_class", Value._class); Deserialize (Object, "items", Value.Items); end Deserialize; procedure Deserialize (From : in Swagger.Value_Type; Name : in String; Value : out Queue_Type_Vectors.Vector) is List : Swagger.Value_Array_Type; Item : Queue_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 Hudson_Type) is begin Into.Start_Entity (Name); Into.Write_Entity ("_class", Value._class); Serialize (Into, "assignedLabels", Value.Assigned_Labels); Into.Write_Entity ("mode", Value.Mode); Into.Write_Entity ("nodeDescription", Value.Node_Description); Into.Write_Entity ("nodeName", Value.Node_Name); Into.Write_Entity ("numExecutors", Value.Num_Executors); Into.Write_Entity ("description", Value.Description); Serialize (Into, "jobs", Value.Jobs); Serialize (Into, "primaryView", Value.Primary_View); Into.Write_Entity ("quietingDown", Value.Quieting_Down); Into.Write_Entity ("slaveAgentPort", Value.Slave_Agent_Port); Serialize (Into, "unlabeledLoad", Value.Unlabeled_Load); Into.Write_Entity ("useCrumbs", Value.Use_Crumbs); Into.Write_Entity ("useSecurity", Value.Use_Security); Serialize (Into, "views", Value.Views); Into.End_Entity (Name); end Serialize; procedure Serialize (Into : in out Swagger.Streams.Output_Stream'Class; Name : in String; Value : in Hudson_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 Hudson_Type) is Object : Swagger.Value_Type; begin Swagger.Streams.Deserialize (From, Name, Object); Swagger.Streams.Deserialize (Object, "_class", Value._class); Deserialize (Object, "assignedLabels", Value.Assigned_Labels); Swagger.Streams.Deserialize (Object, "mode", Value.Mode); Swagger.Streams.Deserialize (Object, "nodeDescription", Value.Node_Description); Swagger.Streams.Deserialize (Object, "nodeName", Value.Node_Name); Swagger.Streams.Deserialize (Object, "numExecutors", Value.Num_Executors); Swagger.Streams.Deserialize (Object, "description", Value.Description); Deserialize (Object, "jobs", Value.Jobs); Deserialize (Object, "primaryView", Value.Primary_View); Swagger.Streams.Deserialize (Object, "quietingDown", Value.Quieting_Down); Swagger.Streams.Deserialize (Object, "slaveAgentPort", Value.Slave_Agent_Port); Deserialize (Object, "unlabeledLoad", Value.Unlabeled_Load); Swagger.Streams.Deserialize (Object, "useCrumbs", Value.Use_Crumbs); Swagger.Streams.Deserialize (Object, "useSecurity", Value.Use_Security); Deserialize (Object, "views", Value.Views); end Deserialize; procedure Deserialize (From : in Swagger.Value_Type; Name : in String; Value : out Hudson_Type_Vectors.Vector) is List : Swagger.Value_Array_Type; Item : Hudson_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 ListView_Type) is begin Into.Start_Entity (Name); Into.Write_Entity ("_class", Value._class); Into.Write_Entity ("description", Value.Description); Serialize (Into, "jobs", Value.Jobs); Into.Write_Entity ("name", Value.Name); Into.Write_Entity ("url", Value.Url); Into.End_Entity (Name); end Serialize; procedure Serialize (Into : in out Swagger.Streams.Output_Stream'Class; Name : in String; Value : in ListView_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 ListView_Type) is Object : Swagger.Value_Type; begin Swagger.Streams.Deserialize (From, Name, Object); Swagger.Streams.Deserialize (Object, "_class", Value._class); Swagger.Streams.Deserialize (Object, "description", Value.Description); Deserialize (Object, "jobs", Value.Jobs); Swagger.Streams.Deserialize (Object, "name", Value.Name); Swagger.Streams.Deserialize (Object, "url", Value.Url); end Deserialize; procedure Deserialize (From : in Swagger.Value_Type; Name : in String; Value : out ListView_Type_Vectors.Vector) is List : Swagger.Value_Array_Type; Item : ListView_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 HudsonMasterComputerexecutors_Type) is begin Into.Start_Entity (Name); Serialize (Into, "currentExecutable", Value.Current_Executable); Into.Write_Entity ("idle", Value.Idle); Into.Write_Entity ("likelyStuck", Value.Likely_Stuck); Into.Write_Entity ("number", Value.Number); Into.Write_Entity ("progress", Value.Progress); Into.Write_Entity ("_class", Value._class); Into.End_Entity (Name); end Serialize; procedure Serialize (Into : in out Swagger.Streams.Output_Stream'Class; Name : in String; Value : in HudsonMasterComputerexecutors_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 HudsonMasterComputerexecutors_Type) is Object : Swagger.Value_Type; begin Swagger.Streams.Deserialize (From, Name, Object); Deserialize (Object, "currentExecutable", Value.Current_Executable); Swagger.Streams.Deserialize (Object, "idle", Value.Idle); Swagger.Streams.Deserialize (Object, "likelyStuck", Value.Likely_Stuck); Swagger.Streams.Deserialize (Object, "number", Value.Number); Swagger.Streams.Deserialize (Object, "progress", Value.Progress); Swagger.Streams.Deserialize (Object, "_class", Value._class); end Deserialize; procedure Deserialize (From : in Swagger.Value_Type; Name : in String; Value : out HudsonMasterComputerexecutors_Type_Vectors.Vector) is List : Swagger.Value_Array_Type; Item : HudsonMasterComputerexecutors_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 HudsonMasterComputer_Type) is begin Into.Start_Entity (Name); Into.Write_Entity ("_class", Value._class); Into.Write_Entity ("displayName", Value.Display_Name); Serialize (Into, "executors", Value.Executors); Into.Write_Entity ("icon", Value.Icon); Into.Write_Entity ("iconClassName", Value.Icon_Class_Name); Into.Write_Entity ("idle", Value.Idle); Into.Write_Entity ("jnlpAgent", Value.Jnlp_Agent); Into.Write_Entity ("launchSupported", Value.Launch_Supported); Serialize (Into, "loadStatistics", Value.Load_Statistics); Into.Write_Entity ("manualLaunchAllowed", Value.Manual_Launch_Allowed); Serialize (Into, "monitorData", Value.Monitor_Data); Into.Write_Entity ("numExecutors", Value.Num_Executors); Into.Write_Entity ("offline", Value.Offline); Into.Write_Entity ("offlineCause", Value.Offline_Cause); Into.Write_Entity ("offlineCauseReason", Value.Offline_Cause_Reason); Into.Write_Entity ("temporarilyOffline", Value.Temporarily_Offline); Into.End_Entity (Name); end Serialize; procedure Serialize (Into : in out Swagger.Streams.Output_Stream'Class; Name : in String; Value : in HudsonMasterComputer_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 HudsonMasterComputer_Type) is Object : Swagger.Value_Type; begin Swagger.Streams.Deserialize (From, Name, Object); Swagger.Streams.Deserialize (Object, "_class", Value._class); Swagger.Streams.Deserialize (Object, "displayName", Value.Display_Name); Deserialize (Object, "executors", Value.Executors); Swagger.Streams.Deserialize (Object, "icon", Value.Icon); Swagger.Streams.Deserialize (Object, "iconClassName", Value.Icon_Class_Name); Swagger.Streams.Deserialize (Object, "idle", Value.Idle); Swagger.Streams.Deserialize (Object, "jnlpAgent", Value.Jnlp_Agent); Swagger.Streams.Deserialize (Object, "launchSupported", Value.Launch_Supported); Deserialize (Object, "loadStatistics", Value.Load_Statistics); Swagger.Streams.Deserialize (Object, "manualLaunchAllowed", Value.Manual_Launch_Allowed); Deserialize (Object, "monitorData", Value.Monitor_Data); Swagger.Streams.Deserialize (Object, "numExecutors", Value.Num_Executors); Swagger.Streams.Deserialize (Object, "offline", Value.Offline); Swagger.Streams.Deserialize (Object, "offlineCause", Value.Offline_Cause); Swagger.Streams.Deserialize (Object, "offlineCauseReason", Value.Offline_Cause_Reason); Swagger.Streams.Deserialize (Object, "temporarilyOffline", Value.Temporarily_Offline); end Deserialize; procedure Deserialize (From : in Swagger.Value_Type; Name : in String; Value : out HudsonMasterComputer_Type_Vectors.Vector) is List : Swagger.Value_Array_Type; Item : HudsonMasterComputer_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 ComputerSet_Type) is begin Into.Start_Entity (Name); Into.Write_Entity ("_class", Value._class); Into.Write_Entity ("busyExecutors", Value.Busy_Executors); Serialize (Into, "computer", Value.Computer); Into.Write_Entity ("displayName", Value.Display_Name); Into.Write_Entity ("totalExecutors", Value.Total_Executors); Into.End_Entity (Name); end Serialize; procedure Serialize (Into : in out Swagger.Streams.Output_Stream'Class; Name : in String; Value : in ComputerSet_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 ComputerSet_Type) is Object : Swagger.Value_Type; begin Swagger.Streams.Deserialize (From, Name, Object); Swagger.Streams.Deserialize (Object, "_class", Value._class); Swagger.Streams.Deserialize (Object, "busyExecutors", Value.Busy_Executors); Deserialize (Object, "computer", Value.Computer); Swagger.Streams.Deserialize (Object, "displayName", Value.Display_Name); Swagger.Streams.Deserialize (Object, "totalExecutors", Value.Total_Executors); end Deserialize; procedure Deserialize (From : in Swagger.Value_Type; Name : in String; Value : out ComputerSet_Type_Vectors.Vector) is List : Swagger.Value_Array_Type; Item : ComputerSet_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 MultibranchPipeline_Type) is begin Into.Start_Entity (Name); Into.Write_Entity ("displayName", Value.Display_Name); Into.Write_Entity ("estimatedDurationInMillis", Value.Estimated_Duration_In_Millis); Into.Write_Entity ("latestRun", Value.Latest_Run); Into.Write_Entity ("name", Value.Name); Into.Write_Entity ("organization", Value.Organization); Into.Write_Entity ("weatherScore", Value.Weather_Score); Serialize (Into, "branchNames", Value.Branch_Names); Into.Write_Entity ("numberOfFailingBranches", Value.Number_Of_Failing_Branches); Into.Write_Entity ("numberOfFailingPullRequests", Value.Number_Of_Failing_Pull_Requests); Into.Write_Entity ("numberOfSuccessfulBranches", Value.Number_Of_Successful_Branches); Into.Write_Entity ("numberOfSuccessfulPullRequests", Value.Number_Of_Successful_Pull_Requests); Into.Write_Entity ("totalNumberOfBranches", Value.Total_Number_Of_Branches); Into.Write_Entity ("totalNumberOfPullRequests", Value.Total_Number_Of_Pull_Requests); Into.Write_Entity ("_class", Value._class); Into.End_Entity (Name); end Serialize; procedure Serialize (Into : in out Swagger.Streams.Output_Stream'Class; Name : in String; Value : in MultibranchPipeline_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 MultibranchPipeline_Type) is Object : Swagger.Value_Type; begin Swagger.Streams.Deserialize (From, Name, Object); Swagger.Streams.Deserialize (Object, "displayName", Value.Display_Name); Swagger.Streams.Deserialize (Object, "estimatedDurationInMillis", Value.Estimated_Duration_In_Millis); Swagger.Streams.Deserialize (Object, "latestRun", Value.Latest_Run); Swagger.Streams.Deserialize (Object, "name", Value.Name); Swagger.Streams.Deserialize (Object, "organization", Value.Organization); Swagger.Streams.Deserialize (Object, "weatherScore", Value.Weather_Score); Swagger.Streams.Deserialize (Object, "branchNames", Value.Branch_Names); Swagger.Streams.Deserialize (Object, "numberOfFailingBranches", Value.Number_Of_Failing_Branches); Swagger.Streams.Deserialize (Object, "numberOfFailingPullRequests", Value.Number_Of_Failing_Pull_Requests); Swagger.Streams.Deserialize (Object, "numberOfSuccessfulBranches", Value.Number_Of_Successful_Branches); Swagger.Streams.Deserialize (Object, "numberOfSuccessfulPullRequests", Value.Number_Of_Successful_Pull_Requests); Swagger.Streams.Deserialize (Object, "totalNumberOfBranches", Value.Total_Number_Of_Branches); Swagger.Streams.Deserialize (Object, "totalNumberOfPullRequests", Value.Total_Number_Of_Pull_Requests); Swagger.Streams.Deserialize (Object, "_class", Value._class); end Deserialize; procedure Deserialize (From : in Swagger.Value_Type; Name : in String; Value : out MultibranchPipeline_Type_Vectors.Vector) is List : Swagger.Value_Array_Type; Item : MultibranchPipeline_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 Organisation_Type) is begin Into.Start_Entity (Name); Into.Write_Entity ("_class", Value._class); 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 Organisation_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 Organisation_Type) is Object : Swagger.Value_Type; begin Swagger.Streams.Deserialize (From, Name, Object); Swagger.Streams.Deserialize (Object, "_class", Value._class); Swagger.Streams.Deserialize (Object, "name", Value.Name); end Deserialize; procedure Deserialize (From : in Swagger.Value_Type; Name : in String; Value : out Organisation_Type_Vectors.Vector) is List : Swagger.Value_Array_Type; Item : Organisation_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 PipelinelatestRunartifacts_Type) is begin Into.Start_Entity (Name); Into.Write_Entity ("name", Value.Name); Into.Write_Entity ("size", Value.Size); Into.Write_Entity ("url", Value.Url); Into.Write_Entity ("_class", Value._class); Into.End_Entity (Name); end Serialize; procedure Serialize (Into : in out Swagger.Streams.Output_Stream'Class; Name : in String; Value : in PipelinelatestRunartifacts_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 PipelinelatestRunartifacts_Type) is Object : Swagger.Value_Type; begin Swagger.Streams.Deserialize (From, Name, Object); Swagger.Streams.Deserialize (Object, "name", Value.Name); Swagger.Streams.Deserialize (Object, "size", Value.Size); Swagger.Streams.Deserialize (Object, "url", Value.Url); Swagger.Streams.Deserialize (Object, "_class", Value._class); end Deserialize; procedure Deserialize (From : in Swagger.Value_Type; Name : in String; Value : out PipelinelatestRunartifacts_Type_Vectors.Vector) is List : Swagger.Value_Array_Type; Item : PipelinelatestRunartifacts_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 PipelinelatestRun_Type) is begin Into.Start_Entity (Name); Serialize (Into, "artifacts", Value.Artifacts); Into.Write_Entity ("durationInMillis", Value.Duration_In_Millis); Into.Write_Entity ("estimatedDurationInMillis", Value.Estimated_Duration_In_Millis); Into.Write_Entity ("enQueueTime", Value.En_Queue_Time); Into.Write_Entity ("endTime", Value.End_Time); Into.Write_Entity ("id", Value.Id); Into.Write_Entity ("organization", Value.Organization); Into.Write_Entity ("pipeline", Value.Pipeline); Into.Write_Entity ("result", Value.Result); Into.Write_Entity ("runSummary", Value.Run_Summary); Into.Write_Entity ("startTime", Value.Start_Time); Into.Write_Entity ("state", Value.State); Into.Write_Entity ("type", Value.P_Type); Into.Write_Entity ("commitId", Value.Commit_Id); Into.Write_Entity ("_class", Value._class); Into.End_Entity (Name); end Serialize; procedure Serialize (Into : in out Swagger.Streams.Output_Stream'Class; Name : in String; Value : in PipelinelatestRun_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 PipelinelatestRun_Type) is Object : Swagger.Value_Type; begin Swagger.Streams.Deserialize (From, Name, Object); Deserialize (Object, "artifacts", Value.Artifacts); Swagger.Streams.Deserialize (Object, "durationInMillis", Value.Duration_In_Millis); Swagger.Streams.Deserialize (Object, "estimatedDurationInMillis", Value.Estimated_Duration_In_Millis); Swagger.Streams.Deserialize (Object, "enQueueTime", Value.En_Queue_Time); Swagger.Streams.Deserialize (Object, "endTime", Value.End_Time); Swagger.Streams.Deserialize (Object, "id", Value.Id); Swagger.Streams.Deserialize (Object, "organization", Value.Organization); Swagger.Streams.Deserialize (Object, "pipeline", Value.Pipeline); Swagger.Streams.Deserialize (Object, "result", Value.Result); Swagger.Streams.Deserialize (Object, "runSummary", Value.Run_Summary); Swagger.Streams.Deserialize (Object, "startTime", Value.Start_Time); Swagger.Streams.Deserialize (Object, "state", Value.State); Swagger.Streams.Deserialize (Object, "type", Value.P_Type); Swagger.Streams.Deserialize (Object, "commitId", Value.Commit_Id); Swagger.Streams.Deserialize (Object, "_class", Value._class); end Deserialize; procedure Deserialize (From : in Swagger.Value_Type; Name : in String; Value : out PipelinelatestRun_Type_Vectors.Vector) is List : Swagger.Value_Array_Type; Item : PipelinelatestRun_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 Pipeline_Type) is begin Into.Start_Entity (Name); Into.Write_Entity ("_class", Value._class); Into.Write_Entity ("organization", Value.Organization); Into.Write_Entity ("name", Value.Name); Into.Write_Entity ("displayName", Value.Display_Name); Into.Write_Entity ("fullName", Value.Full_Name); Into.Write_Entity ("weatherScore", Value.Weather_Score); Into.Write_Entity ("estimatedDurationInMillis", Value.Estimated_Duration_In_Millis); Serialize (Into, "latestRun", Value.Latest_Run); Into.End_Entity (Name); end Serialize; procedure Serialize (Into : in out Swagger.Streams.Output_Stream'Class; Name : in String; Value : in Pipeline_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 Pipeline_Type) is Object : Swagger.Value_Type; begin Swagger.Streams.Deserialize (From, Name, Object); Swagger.Streams.Deserialize (Object, "_class", Value._class); Swagger.Streams.Deserialize (Object, "organization", Value.Organization); Swagger.Streams.Deserialize (Object, "name", Value.Name); Swagger.Streams.Deserialize (Object, "displayName", Value.Display_Name); Swagger.Streams.Deserialize (Object, "fullName", Value.Full_Name); Swagger.Streams.Deserialize (Object, "weatherScore", Value.Weather_Score); Swagger.Streams.Deserialize (Object, "estimatedDurationInMillis", Value.Estimated_Duration_In_Millis); Deserialize (Object, "latestRun", Value.Latest_Run); end Deserialize; procedure Deserialize (From : in Swagger.Value_Type; Name : in String; Value : out Pipeline_Type_Vectors.Vector) is List : Swagger.Value_Array_Type; Item : Pipeline_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 StringParameterValue_Type) is begin Into.Start_Entity (Name); Into.Write_Entity ("_class", Value._class); Into.Write_Entity ("name", Value.Name); Into.Write_Entity ("value", Value.Value); Into.End_Entity (Name); end Serialize; procedure Serialize (Into : in out Swagger.Streams.Output_Stream'Class; Name : in String; Value : in StringParameterValue_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 StringParameterValue_Type) is Object : Swagger.Value_Type; begin Swagger.Streams.Deserialize (From, Name, Object); Swagger.Streams.Deserialize (Object, "_class", Value._class); Swagger.Streams.Deserialize (Object, "name", Value.Name); Swagger.Streams.Deserialize (Object, "value", Value.Value); end Deserialize; procedure Deserialize (From : in Swagger.Value_Type; Name : in String; Value : out StringParameterValue_Type_Vectors.Vector) is List : Swagger.Value_Array_Type; Item : StringParameterValue_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 StringParameterDefinition_Type) is begin Into.Start_Entity (Name); Into.Write_Entity ("_class", Value._class); Serialize (Into, "defaultParameterValue", Value.Default_Parameter_Value); Into.Write_Entity ("description", Value.Description); Into.Write_Entity ("name", Value.Name); Into.Write_Entity ("type", Value.P_Type); Into.End_Entity (Name); end Serialize; procedure Serialize (Into : in out Swagger.Streams.Output_Stream'Class; Name : in String; Value : in StringParameterDefinition_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 StringParameterDefinition_Type) is Object : Swagger.Value_Type; begin Swagger.Streams.Deserialize (From, Name, Object); Swagger.Streams.Deserialize (Object, "_class", Value._class); Deserialize (Object, "defaultParameterValue", Value.Default_Parameter_Value); Swagger.Streams.Deserialize (Object, "description", Value.Description); Swagger.Streams.Deserialize (Object, "name", Value.Name); Swagger.Streams.Deserialize (Object, "type", Value.P_Type); end Deserialize; procedure Deserialize (From : in Swagger.Value_Type; Name : in String; Value : out StringParameterDefinition_Type_Vectors.Vector) is List : Swagger.Value_Array_Type; Item : StringParameterDefinition_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 InputStepImpl_Type) is begin Into.Start_Entity (Name); Into.Write_Entity ("_class", Value._class); Serialize (Into, "_links", Value._links); Into.Write_Entity ("id", Value.Id); Into.Write_Entity ("message", Value.Message); Into.Write_Entity ("ok", Value.Ok); Serialize (Into, "parameters", Value.Parameters); Into.Write_Entity ("submitter", Value.Submitter); Into.End_Entity (Name); end Serialize; procedure Serialize (Into : in out Swagger.Streams.Output_Stream'Class; Name : in String; Value : in InputStepImpl_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 InputStepImpl_Type) is Object : Swagger.Value_Type; begin Swagger.Streams.Deserialize (From, Name, Object); Swagger.Streams.Deserialize (Object, "_class", Value._class); Deserialize (Object, "_links", Value._links); Swagger.Streams.Deserialize (Object, "id", Value.Id); Swagger.Streams.Deserialize (Object, "message", Value.Message); Swagger.Streams.Deserialize (Object, "ok", Value.Ok); Deserialize (Object, "parameters", Value.Parameters); Swagger.Streams.Deserialize (Object, "submitter", Value.Submitter); end Deserialize; procedure Deserialize (From : in Swagger.Value_Type; Name : in String; Value : out InputStepImpl_Type_Vectors.Vector) is List : Swagger.Value_Array_Type; Item : InputStepImpl_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 PipelineStepImpl_Type) is begin Into.Start_Entity (Name); Into.Write_Entity ("_class", Value._class); Serialize (Into, "_links", Value._links); Into.Write_Entity ("displayName", Value.Display_Name); Into.Write_Entity ("durationInMillis", Value.Duration_In_Millis); Into.Write_Entity ("id", Value.Id); Serialize (Into, "input", Value.Input); Into.Write_Entity ("result", Value.Result); Into.Write_Entity ("startTime", Value.Start_Time); Into.Write_Entity ("state", Value.State); Into.End_Entity (Name); end Serialize; procedure Serialize (Into : in out Swagger.Streams.Output_Stream'Class; Name : in String; Value : in PipelineStepImpl_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 PipelineStepImpl_Type) is Object : Swagger.Value_Type; begin Swagger.Streams.Deserialize (From, Name, Object); Swagger.Streams.Deserialize (Object, "_class", Value._class); Deserialize (Object, "_links", Value._links); Swagger.Streams.Deserialize (Object, "displayName", Value.Display_Name); Swagger.Streams.Deserialize (Object, "durationInMillis", Value.Duration_In_Millis); Swagger.Streams.Deserialize (Object, "id", Value.Id); Deserialize (Object, "input", Value.Input); Swagger.Streams.Deserialize (Object, "result", Value.Result); Swagger.Streams.Deserialize (Object, "startTime", Value.Start_Time); Swagger.Streams.Deserialize (Object, "state", Value.State); end Deserialize; procedure Deserialize (From : in Swagger.Value_Type; Name : in String; Value : out PipelineStepImpl_Type_Vectors.Vector) is List : Swagger.Value_Array_Type; Item : PipelineStepImpl_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 BranchImplpermissions_Type) is begin Into.Start_Entity (Name); Into.Write_Entity ("create", Value.Create); Into.Write_Entity ("read", Value.Read); Into.Write_Entity ("start", Value.Start); Into.Write_Entity ("stop", Value.Stop); Into.Write_Entity ("_class", Value._class); Into.End_Entity (Name); end Serialize; procedure Serialize (Into : in out Swagger.Streams.Output_Stream'Class; Name : in String; Value : in BranchImplpermissions_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 BranchImplpermissions_Type) is Object : Swagger.Value_Type; begin Swagger.Streams.Deserialize (From, Name, Object); Swagger.Streams.Deserialize (Object, "create", Value.Create); Swagger.Streams.Deserialize (Object, "read", Value.Read); Swagger.Streams.Deserialize (Object, "start", Value.Start); Swagger.Streams.Deserialize (Object, "stop", Value.Stop); Swagger.Streams.Deserialize (Object, "_class", Value._class); end Deserialize; procedure Deserialize (From : in Swagger.Value_Type; Name : in String; Value : out BranchImplpermissions_Type_Vectors.Vector) is List : Swagger.Value_Array_Type; Item : BranchImplpermissions_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 BranchImpl_Type) is begin Into.Start_Entity (Name); Into.Write_Entity ("_class", Value._class); Into.Write_Entity ("displayName", Value.Display_Name); Into.Write_Entity ("estimatedDurationInMillis", Value.Estimated_Duration_In_Millis); Into.Write_Entity ("fullDisplayName", Value.Full_Display_Name); Into.Write_Entity ("fullName", Value.Full_Name); Into.Write_Entity ("name", Value.Name); Into.Write_Entity ("organization", Value.Organization); Serialize (Into, "parameters", Value.Parameters); Serialize (Into, "permissions", Value.Permissions); Into.Write_Entity ("weatherScore", Value.Weather_Score); Into.Write_Entity ("pullRequest", Value.Pull_Request); Serialize (Into, "_links", Value._links); Serialize (Into, "latestRun", Value.Latest_Run); Into.End_Entity (Name); end Serialize; procedure Serialize (Into : in out Swagger.Streams.Output_Stream'Class; Name : in String; Value : in BranchImpl_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 BranchImpl_Type) is Object : Swagger.Value_Type; begin Swagger.Streams.Deserialize (From, Name, Object); Swagger.Streams.Deserialize (Object, "_class", Value._class); Swagger.Streams.Deserialize (Object, "displayName", Value.Display_Name); Swagger.Streams.Deserialize (Object, "estimatedDurationInMillis", Value.Estimated_Duration_In_Millis); Swagger.Streams.Deserialize (Object, "fullDisplayName", Value.Full_Display_Name); Swagger.Streams.Deserialize (Object, "fullName", Value.Full_Name); Swagger.Streams.Deserialize (Object, "name", Value.Name); Swagger.Streams.Deserialize (Object, "organization", Value.Organization); Deserialize (Object, "parameters", Value.Parameters); Deserialize (Object, "permissions", Value.Permissions); Swagger.Streams.Deserialize (Object, "weatherScore", Value.Weather_Score); Swagger.Streams.Deserialize (Object, "pullRequest", Value.Pull_Request); Deserialize (Object, "_links", Value._links); Deserialize (Object, "latestRun", Value.Latest_Run); end Deserialize; procedure Deserialize (From : in Swagger.Value_Type; Name : in String; Value : out BranchImpl_Type_Vectors.Vector) is List : Swagger.Value_Array_Type; Item : BranchImpl_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 PipelineBranchesitemlatestRun_Type) is begin Into.Start_Entity (Name); Into.Write_Entity ("durationInMillis", Value.Duration_In_Millis); Into.Write_Entity ("estimatedDurationInMillis", Value.Estimated_Duration_In_Millis); Into.Write_Entity ("enQueueTime", Value.En_Queue_Time); Into.Write_Entity ("endTime", Value.End_Time); Into.Write_Entity ("id", Value.Id); Into.Write_Entity ("organization", Value.Organization); Into.Write_Entity ("pipeline", Value.Pipeline); Into.Write_Entity ("result", Value.Result); Into.Write_Entity ("runSummary", Value.Run_Summary); Into.Write_Entity ("startTime", Value.Start_Time); Into.Write_Entity ("state", Value.State); Into.Write_Entity ("type", Value.P_Type); Into.Write_Entity ("commitId", Value.Commit_Id); Into.Write_Entity ("_class", Value._class); Into.End_Entity (Name); end Serialize; procedure Serialize (Into : in out Swagger.Streams.Output_Stream'Class; Name : in String; Value : in PipelineBranchesitemlatestRun_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 PipelineBranchesitemlatestRun_Type) is Object : Swagger.Value_Type; begin Swagger.Streams.Deserialize (From, Name, Object); Swagger.Streams.Deserialize (Object, "durationInMillis", Value.Duration_In_Millis); Swagger.Streams.Deserialize (Object, "estimatedDurationInMillis", Value.Estimated_Duration_In_Millis); Swagger.Streams.Deserialize (Object, "enQueueTime", Value.En_Queue_Time); Swagger.Streams.Deserialize (Object, "endTime", Value.End_Time); Swagger.Streams.Deserialize (Object, "id", Value.Id); Swagger.Streams.Deserialize (Object, "organization", Value.Organization); Swagger.Streams.Deserialize (Object, "pipeline", Value.Pipeline); Swagger.Streams.Deserialize (Object, "result", Value.Result); Swagger.Streams.Deserialize (Object, "runSummary", Value.Run_Summary); Swagger.Streams.Deserialize (Object, "startTime", Value.Start_Time); Swagger.Streams.Deserialize (Object, "state", Value.State); Swagger.Streams.Deserialize (Object, "type", Value.P_Type); Swagger.Streams.Deserialize (Object, "commitId", Value.Commit_Id); Swagger.Streams.Deserialize (Object, "_class", Value._class); end Deserialize; procedure Deserialize (From : in Swagger.Value_Type; Name : in String; Value : out PipelineBranchesitemlatestRun_Type_Vectors.Vector) is List : Swagger.Value_Array_Type; Item : PipelineBranchesitemlatestRun_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 PipelineBranchesitem_Type) is begin Into.Start_Entity (Name); Into.Write_Entity ("displayName", Value.Display_Name); Into.Write_Entity ("estimatedDurationInMillis", Value.Estimated_Duration_In_Millis); Into.Write_Entity ("name", Value.Name); Into.Write_Entity ("weatherScore", Value.Weather_Score); Serialize (Into, "latestRun", Value.Latest_Run); Into.Write_Entity ("organization", Value.Organization); Serialize (Into, "pullRequest", Value.Pull_Request); Into.Write_Entity ("totalNumberOfPullRequests", Value.Total_Number_Of_Pull_Requests); Into.Write_Entity ("_class", Value._class); Into.End_Entity (Name); end Serialize; procedure Serialize (Into : in out Swagger.Streams.Output_Stream'Class; Name : in String; Value : in PipelineBranchesitem_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 PipelineBranchesitem_Type) is Object : Swagger.Value_Type; begin Swagger.Streams.Deserialize (From, Name, Object); Swagger.Streams.Deserialize (Object, "displayName", Value.Display_Name); Swagger.Streams.Deserialize (Object, "estimatedDurationInMillis", Value.Estimated_Duration_In_Millis); Swagger.Streams.Deserialize (Object, "name", Value.Name); Swagger.Streams.Deserialize (Object, "weatherScore", Value.Weather_Score); Deserialize (Object, "latestRun", Value.Latest_Run); Swagger.Streams.Deserialize (Object, "organization", Value.Organization); Deserialize (Object, "pullRequest", Value.Pull_Request); Swagger.Streams.Deserialize (Object, "totalNumberOfPullRequests", Value.Total_Number_Of_Pull_Requests); Swagger.Streams.Deserialize (Object, "_class", Value._class); end Deserialize; procedure Deserialize (From : in Swagger.Value_Type; Name : in String; Value : out PipelineBranchesitem_Type_Vectors.Vector) is List : Swagger.Value_Array_Type; Item : PipelineBranchesitem_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 PipelineFolderImpl_Type) is begin Into.Start_Entity (Name); Into.Write_Entity ("_class", Value._class); Into.Write_Entity ("displayName", Value.Display_Name); Into.Write_Entity ("fullName", Value.Full_Name); Into.Write_Entity ("name", Value.Name); Into.Write_Entity ("organization", Value.Organization); Into.Write_Entity ("numberOfFolders", Value.Number_Of_Folders); Into.Write_Entity ("numberOfPipelines", Value.Number_Of_Pipelines); Into.End_Entity (Name); end Serialize; procedure Serialize (Into : in out Swagger.Streams.Output_Stream'Class; Name : in String; Value : in PipelineFolderImpl_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 PipelineFolderImpl_Type) is Object : Swagger.Value_Type; begin Swagger.Streams.Deserialize (From, Name, Object); Swagger.Streams.Deserialize (Object, "_class", Value._class); Swagger.Streams.Deserialize (Object, "displayName", Value.Display_Name); Swagger.Streams.Deserialize (Object, "fullName", Value.Full_Name); Swagger.Streams.Deserialize (Object, "name", Value.Name); Swagger.Streams.Deserialize (Object, "organization", Value.Organization); Swagger.Streams.Deserialize (Object, "numberOfFolders", Value.Number_Of_Folders); Swagger.Streams.Deserialize (Object, "numberOfPipelines", Value.Number_Of_Pipelines); end Deserialize; procedure Deserialize (From : in Swagger.Value_Type; Name : in String; Value : out PipelineFolderImpl_Type_Vectors.Vector) is List : Swagger.Value_Array_Type; Item : PipelineFolderImpl_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 PipelineRunNodeedges_Type) is begin Into.Start_Entity (Name); Into.Write_Entity ("id", Value.Id); Into.Write_Entity ("_class", Value._class); Into.End_Entity (Name); end Serialize; procedure Serialize (Into : in out Swagger.Streams.Output_Stream'Class; Name : in String; Value : in PipelineRunNodeedges_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 PipelineRunNodeedges_Type) is Object : Swagger.Value_Type; begin Swagger.Streams.Deserialize (From, Name, Object); Swagger.Streams.Deserialize (Object, "id", Value.Id); Swagger.Streams.Deserialize (Object, "_class", Value._class); end Deserialize; procedure Deserialize (From : in Swagger.Value_Type; Name : in String; Value : out PipelineRunNodeedges_Type_Vectors.Vector) is List : Swagger.Value_Array_Type; Item : PipelineRunNodeedges_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 PipelineRunNode_Type) is begin Into.Start_Entity (Name); Into.Write_Entity ("_class", Value._class); Into.Write_Entity ("displayName", Value.Display_Name); Into.Write_Entity ("durationInMillis", Value.Duration_In_Millis); Serialize (Into, "edges", Value.Edges); Into.Write_Entity ("id", Value.Id); Into.Write_Entity ("result", Value.Result); Into.Write_Entity ("startTime", Value.Start_Time); Into.Write_Entity ("state", Value.State); Into.End_Entity (Name); end Serialize; procedure Serialize (Into : in out Swagger.Streams.Output_Stream'Class; Name : in String; Value : in PipelineRunNode_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 PipelineRunNode_Type) is Object : Swagger.Value_Type; begin Swagger.Streams.Deserialize (From, Name, Object); Swagger.Streams.Deserialize (Object, "_class", Value._class); Swagger.Streams.Deserialize (Object, "displayName", Value.Display_Name); Swagger.Streams.Deserialize (Object, "durationInMillis", Value.Duration_In_Millis); Deserialize (Object, "edges", Value.Edges); Swagger.Streams.Deserialize (Object, "id", Value.Id); Swagger.Streams.Deserialize (Object, "result", Value.Result); Swagger.Streams.Deserialize (Object, "startTime", Value.Start_Time); Swagger.Streams.Deserialize (Object, "state", Value.State); end Deserialize; procedure Deserialize (From : in Swagger.Value_Type; Name : in String; Value : out PipelineRunNode_Type_Vectors.Vector) is List : Swagger.Value_Array_Type; Item : PipelineRunNode_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 GithubRepositorypermissions_Type) is begin Into.Start_Entity (Name); Into.Write_Entity ("admin", Value.Admin); Into.Write_Entity ("push", Value.Push); Into.Write_Entity ("pull", Value.Pull); Into.Write_Entity ("_class", Value._class); Into.End_Entity (Name); end Serialize; procedure Serialize (Into : in out Swagger.Streams.Output_Stream'Class; Name : in String; Value : in GithubRepositorypermissions_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 GithubRepositorypermissions_Type) is Object : Swagger.Value_Type; begin Swagger.Streams.Deserialize (From, Name, Object); Swagger.Streams.Deserialize (Object, "admin", Value.Admin); Swagger.Streams.Deserialize (Object, "push", Value.Push); Swagger.Streams.Deserialize (Object, "pull", Value.Pull); Swagger.Streams.Deserialize (Object, "_class", Value._class); end Deserialize; procedure Deserialize (From : in Swagger.Value_Type; Name : in String; Value : out GithubRepositorypermissions_Type_Vectors.Vector) is List : Swagger.Value_Array_Type; Item : GithubRepositorypermissions_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 GithubRepository_Type) is begin Into.Start_Entity (Name); Into.Write_Entity ("_class", Value._class); Serialize (Into, "_links", Value._links); Into.Write_Entity ("defaultBranch", Value.Default_Branch); Into.Write_Entity ("description", Value.Description); Into.Write_Entity ("name", Value.Name); Serialize (Into, "permissions", Value.Permissions); Into.Write_Entity ("private", Value.P_Private); Into.Write_Entity ("fullName", Value.Full_Name); Into.End_Entity (Name); end Serialize; procedure Serialize (Into : in out Swagger.Streams.Output_Stream'Class; Name : in String; Value : in GithubRepository_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 GithubRepository_Type) is Object : Swagger.Value_Type; begin Swagger.Streams.Deserialize (From, Name, Object); Swagger.Streams.Deserialize (Object, "_class", Value._class); Deserialize (Object, "_links", Value._links); Swagger.Streams.Deserialize (Object, "defaultBranch", Value.Default_Branch); Swagger.Streams.Deserialize (Object, "description", Value.Description); Swagger.Streams.Deserialize (Object, "name", Value.Name); Deserialize (Object, "permissions", Value.Permissions); Swagger.Streams.Deserialize (Object, "private", Value.P_Private); Swagger.Streams.Deserialize (Object, "fullName", Value.Full_Name); end Deserialize; procedure Deserialize (From : in Swagger.Value_Type; Name : in String; Value : out GithubRepository_Type_Vectors.Vector) is List : Swagger.Value_Array_Type; Item : GithubRepository_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 GithubRepositories_Type) is begin Into.Start_Entity (Name); Into.Write_Entity ("_class", Value._class); Serialize (Into, "_links", Value._links); Serialize (Into, "items", Value.Items); Into.Write_Entity ("lastPage", Value.Last_Page); Into.Write_Entity ("nextPage", Value.Next_Page); Into.Write_Entity ("pageSize", Value.Page_Size); Into.End_Entity (Name); end Serialize; procedure Serialize (Into : in out Swagger.Streams.Output_Stream'Class; Name : in String; Value : in GithubRepositories_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 GithubRepositories_Type) is Object : Swagger.Value_Type; begin Swagger.Streams.Deserialize (From, Name, Object); Swagger.Streams.Deserialize (Object, "_class", Value._class); Deserialize (Object, "_links", Value._links); Deserialize (Object, "items", Value.Items); Swagger.Streams.Deserialize (Object, "lastPage", Value.Last_Page); Swagger.Streams.Deserialize (Object, "nextPage", Value.Next_Page); Swagger.Streams.Deserialize (Object, "pageSize", Value.Page_Size); end Deserialize; procedure Deserialize (From : in Swagger.Value_Type; Name : in String; Value : out GithubRepositories_Type_Vectors.Vector) is List : Swagger.Value_Array_Type; Item : GithubRepositories_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 GithubRespositoryContainer_Type) is begin Into.Start_Entity (Name); Into.Write_Entity ("_class", Value._class); Serialize (Into, "_links", Value._links); Serialize (Into, "repositories", Value.Repositories); Into.End_Entity (Name); end Serialize; procedure Serialize (Into : in out Swagger.Streams.Output_Stream'Class; Name : in String; Value : in GithubRespositoryContainer_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 GithubRespositoryContainer_Type) is Object : Swagger.Value_Type; begin Swagger.Streams.Deserialize (From, Name, Object); Swagger.Streams.Deserialize (Object, "_class", Value._class); Deserialize (Object, "_links", Value._links); Deserialize (Object, "repositories", Value.Repositories); end Deserialize; procedure Deserialize (From : in Swagger.Value_Type; Name : in String; Value : out GithubRespositoryContainer_Type_Vectors.Vector) is List : Swagger.Value_Array_Type; Item : GithubRespositoryContainer_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 .Models;
godunko/cga
Ada
5,532
adb
-- -- Copyright (C) 2023, Vadim Godunko <[email protected]> -- -- SPDX-License-Identifier: Apache-2.0 WITH LLVM-exception -- with CGK.Primitives.Directions_3D.Builders; with CGK.Primitives.Points_2D; with CGK.Primitives.XYZs; with CGK.Reals; package body CGK.Primitives.Triangulators_3D is use CGK.Primitives.Directions_3D; use CGK.Primitives.Directions_3D.Builders; use CGK.Primitives.Points_2D; use CGK.Primitives.Points_3D; use CGK.Primitives.Points_3D.Containers; use CGK.Primitives.Triangulators_2D; use CGK.Primitives.XYZs; use CGK.Reals; procedure Invalidate (Self : in out Triangulator_3D); -- Invalidate state of the triangulator. procedure Compute_Plane_Normal_Vector (Self : Triangulator_3D; Normal : out Direction_3D; Success : out Boolean); -- Compute normal vector to polygon's plane. ----------------------- -- Add_Polygon_Point -- ----------------------- function Add_Polygon_Point (Self : in out Triangulator_3D; Point : CGK.Primitives.Points_3D.Point_3D) return Vertex_Index is begin Self.Points.Append (Point); return Vertex_Index (Self.Points.Last); end Add_Polygon_Point; ----------- -- Clear -- ----------- procedure Clear (Self : in out Triangulator_3D) is begin Invalidate (Self); Clear (Self.Triangulator); Self.Points.Clear; end Clear; --------------------------------- -- Compute_Plane_Normal_Vector -- --------------------------------- procedure Compute_Plane_Normal_Vector (Self : Triangulator_3D; Normal : out Direction_3D; Success : out Boolean) is Previous : XYZs.XYZ := Points_3D.XYZ (Self.Points.Last_Element); Current : XYZs.XYZ; Vector : XYZs.XYZ; Builder : Direction_3D_Builder; begin for Index in Self.Points.First .. Self.Points.Last loop Current := Points_3D.XYZ (Self.Points (Index)); Vector := @ + Create_XYZ (Y (Previous) * Z (Current) - Z (Previous) * Y (Current), Z (Previous) * X (Current) - X (Previous) * Z (Current), X (Previous) * Y (Current) - Y (Previous) * X (Current)); Previous := Current; end loop; Build (Builder, Vector); if Is_Valid (Builder) then Normal := (Direction (Builder)); Success := True; else Success := False; end if; end Compute_Plane_Normal_Vector; ---------------- -- Invalidate -- ---------------- procedure Invalidate (Self : in out Triangulator_3D) is begin Self.Valid := False; end Invalidate; -------------- -- Is_Valid -- -------------- function Is_Valid (Self : Triangulator_3D) return Boolean is begin return Self.Valid; end Is_Valid; ------------ -- Length -- ------------ function Length (Self : Triangulator_3D) return Triangle_Count is begin Assert_Invalid_State_Error (Self.Valid); return Triangle_Count (Length (Self.Triangulator)); end Length; -------------- -- Triangle -- -------------- procedure Triangle (Self : Triangulator_3D; Index : Triangle_Index; A : out Vertex_Index; B : out Vertex_Index; C : out Vertex_Index) is begin Assert_Invalid_State_Error (Self.Valid); Triangle (Self.Triangulator, Triangulators_2D.Triangle_Index (Index), Triangulators_2D.Vertex_Index (A), Triangulators_2D.Vertex_Index (B), Triangulators_2D.Vertex_Index (C)); end Triangle; ----------------- -- Triangulate -- ----------------- procedure Triangulate (Self : in out Triangulator_3D) is Normal : Direction_3D; Success : Boolean; Max : Real; Index : Triangulators_2D.Vertex_Index with Unreferenced; begin Invalidate (Self); if Self.Points.Length < 3 then -- Degenerate case. return; end if; Compute_Plane_Normal_Vector (Self, Normal, Success); if not Success then -- Degenerate case: polygon has zero area in each coordinate plane. return; end if; -- Detect coordinate axis with largest component of the normal to the -- polygon's plane and project all points to the 2D plane orthogonal -- to this axis. Max := Real'Max (abs X (Normal), Real'Max (abs Y (Normal), abs Z (Normal))); Clear (Self.Triangulator); if Max = abs X (Normal) then for J in Self.Points.First .. Self.Points.Last loop Index := Add_Polygon_Point (Self.Triangulator, Create_Point_2D (Y (Self.Points (J)), Z (Self.Points (J)))); end loop; elsif Max = abs Y (Normal) then for J in Self.Points.First .. Self.Points.Last loop Index := Add_Polygon_Point (Self.Triangulator, Create_Point_2D (X (Self.Points (J)), Z (Self.Points (J)))); end loop; else for J in Self.Points.First .. Self.Points.Last loop Index := Add_Polygon_Point (Self.Triangulator, Create_Point_2D (X (Self.Points (J)), Y (Self.Points (J)))); end loop; end if; Triangulate (Self.Triangulator); Self.Valid := Is_Valid (Self.Triangulator); end Triangulate; end CGK.Primitives.Triangulators_3D;
damaki/libkeccak
Ada
18,228
adb
------------------------------------------------------------------------------- -- Copyright (c) 2019, Daniel King -- All rights reserved. -- -- Redistribution and use in source and binary forms, with or without -- modification, are permitted provided that the following conditions are met: -- * Redistributions of source code must retain the above copyright -- notice, this list of conditions and the following disclaimer. -- * Redistributions in binary form must reproduce the above copyright -- notice, this list of conditions and the following disclaimer in the -- documentation and/or other materials provided with the distribution. -- * The name of the copyright holder may not be used to endorse or promote -- Products derived from this software without specific prior written -- permission. -- -- THIS SOFTWARE IS PROVIDED BY THE COPYRIGHT HOLDERS AND CONTRIBUTORS "AS IS" -- AND ANY EXPRESS OR IMPLIED WARRANTIES, INCLUDING, BUT NOT LIMITED TO, THE -- IMPLIED WARRANTIES OF MERCHANTABILITY AND FITNESS FOR A PARTICULAR PURPOSE -- ARE DISCLAIMED. IN NO EVENT SHALL THE COPYRIGHT HOLDER BE LIABLE FOR ANY -- DIRECT, INDIRECT, INCIDENTAL, SPECIAL, EXEMPLARY, OR CONSEQUENTIAL DAMAGES -- (INCLUDING, BUT NOT LIMITED TO, PROCUREMENT OF SUBSTITUTE GOODS OR SERVICES; -- LOSS OF USE, DATA, OR PROFITS; OR BUSINESS INTERRUPTION) HOWEVER CAUSED AND -- ON ANY THEORY OF LIABILITY, WHETHER IN CONTRACT, STRICT LIABILITY, OR TORT -- (INCLUDING NEGLIGENCE OR OTHERWISE) ARISING IN ANY WAY OUT OF THE USE OF -- THIS SOFTWARE, EVEN IF ADVISED OF THE POSSIBILITY OF SUCH DAMAGE. ------------------------------------------------------------------------------- with Keccak.Util; package body Keccak.Generic_Parallel_Hash is --------------------------------------- -- Generic_Process_Parallel_Blocks -- --------------------------------------- generic with package SHAKE_Parallel_N is new Keccak.Generic_Parallel_XOF (<>); procedure Generic_Process_Parallel_Blocks (Ctx : in out Context; Data : in Types.Byte_Array) with Pre => (Data'Length = Ctx.Block_Size * SHAKE_Parallel_N.Num_Parallel_Instances and State_Of (Ctx) = Updating and Ctx.Partial_Block_Length = 0), Post => (State_Of (Ctx) = Updating and Ctx.Input_Len = Ctx'Old.Input_Len and Ctx.Partial_Block_Length = Ctx'Old.Partial_Block_Length and Ctx.Block_Size = Ctx'Old.Block_Size); -- Generic procedure to process N blocks in parallel. -- -- This procedure process N blocks in parallel to produce N chaining values -- (CV). The CVs are then processed in the outer (serial) cSHAKE. -- -- @param Ctx The KangarooTwelve context. -- -- @param Data Byte array containing N blocks. --------------------------------------- -- Generic_Process_Parallel_Blocks -- --------------------------------------- procedure Generic_Process_Parallel_Blocks (Ctx : in out Context; Data : in Types.Byte_Array) is N : constant Positive := SHAKE_Parallel_N.Num_Parallel_Instances; Parallel_Ctx : SHAKE_Parallel_N.Context; CV_N : Types.Byte_Array (1 .. CV_Size_Bytes * N); begin -- Process N blocks in parallel and produce N chaining values. SHAKE_Parallel_N.Init (Parallel_Ctx); SHAKE_Parallel_N.Update_Separate (Parallel_Ctx, Data); SHAKE_Parallel_N.Extract_Separate (Parallel_Ctx, CV_N); pragma Unused (Parallel_Ctx); -- Process the chaining values with the outer CSHAKE. CSHAKE_Serial.Update (Ctx => Ctx.Outer_CSHAKE, Message => CV_N); end Generic_Process_Parallel_Blocks; ------------------------------ -- Generic Instantiations -- ------------------------------ procedure Process_8_Parallel_Blocks is new Generic_Process_Parallel_Blocks (SHAKE_Parallel_8); procedure Process_4_Parallel_Blocks is new Generic_Process_Parallel_Blocks (SHAKE_Parallel_4); procedure Process_2_Parallel_Blocks is new Generic_Process_Parallel_Blocks (SHAKE_Parallel_2); ----------------------- -- Process_1_Block -- ----------------------- procedure Process_1_Block (Ctx : in out Context; Data : in Types.Byte_Array) with Pre => (Data'Length <= Ctx.Block_Size and State_Of (Ctx) = Updating and Ctx.Partial_Block_Length = 0), Post => (State_Of (Ctx) = Updating and Ctx.Input_Len = Ctx'Old.Input_Len and Ctx.Partial_Block_Length = Ctx'Old.Partial_Block_Length and Ctx.Block_Size = Ctx'Old.Block_Size); -- Processes a single block using a serial CSHAKE. ----------------------- -- Process_1_Block -- ----------------------- procedure Process_1_Block (Ctx : in out Context; Data : in Types.Byte_Array) is Serial_Ctx : SHAKE_Serial.Context; CV : Types.Byte_Array (1 .. CV_Size_Bytes); begin -- Process N blocks in parallel and produce N changing values. SHAKE_Serial.Init (Serial_Ctx); SHAKE_Serial.Update (Serial_Ctx, Data); SHAKE_Serial.Extract (Serial_Ctx, CV); pragma Unreferenced (Serial_Ctx); -- Process the chaining values with the outer CSHAKE. CSHAKE_Serial.Update (Ctx => Ctx.Outer_CSHAKE, Message => CV); end Process_1_Block; ---------------------------- -- Add_To_Partial_Block -- ---------------------------- procedure Add_To_Partial_Block (Ctx : in out Context; Data : in Types.Byte_Array; Added : out Natural) with Pre => ((if Ctx.Partial_Block_Length > 0 then Max_Input_Length (Ctx) >= Data'Length) and State_Of (Ctx) = Updating), Post => (Added <= Ctx.Block_Size and Added <= Data'Length and (if Added < Data'Length then Ctx.Partial_Block_Length = 0) and State_Of (Ctx) = Updating and Num_Bytes_Processed (Ctx) = Num_Bytes_Processed (Ctx'Old) + Byte_Count (Added) and Ctx.Block_Size = Ctx'Old.Block_Size), Contract_Cases => (Ctx.Partial_Block_Length = 0 and Data'Length = 0 => Added = 0 and Ctx.Partial_Block_Length = 0, Ctx.Partial_Block_Length = 0 and Data'Length > 0 => Added = 0 and Ctx.Partial_Block_Length = 0, Ctx.Partial_Block_Length > 0 and Data'Length = 0 => Added = 0 and Ctx.Partial_Block_Length = Ctx'Old.Partial_Block_Length, Ctx.Partial_Block_Length > 0 and Data'Length > 0 => Added > 0); ---------------------------- -- Add_To_Partial_Block -- ---------------------------- procedure Add_To_Partial_Block (Ctx : in out Context; Data : in Types.Byte_Array; Added : out Natural) is Free_In_Block : Natural; CV : Types.Byte_Array (1 .. CV_Size_Bytes); begin if Ctx.Partial_Block_Length > 0 then Free_In_Block := Ctx.Block_Size - Ctx.Partial_Block_Length; if Data'Length >= Free_In_Block then SHAKE_Serial.Update (Ctx => Ctx.Partial_Block_CSHAKE, Message => Data (Data'First .. Data'First + (Free_In_Block - 1))); pragma Warnings (GNATprove, Off, """Ctx.Partial_Block_CSHAKE"" is set by ""Extract"" but not used after the call", Reason => "No further data needs to be extracted before Init"); SHAKE_Serial.Extract (Ctx => Ctx.Partial_Block_CSHAKE, Digest => CV); pragma Warnings (GNATprove, On); CSHAKE_Serial.Update (Ctx => Ctx.Outer_CSHAKE, Message => CV); SHAKE_Serial.Init (Ctx.Partial_Block_CSHAKE); Ctx.Partial_Block_Length := 0; Ctx.Input_Len := Ctx.Input_Len + Byte_Count (Free_In_Block); Added := Free_In_Block; else SHAKE_Serial.Update (Ctx => Ctx.Partial_Block_CSHAKE, Message => Data); Ctx.Partial_Block_Length := Ctx.Partial_Block_Length + Data'Length; Ctx.Input_Len := Ctx.Input_Len + Byte_Count (Data'Length); Added := Data'Length; end if; else Added := 0; end if; end Add_To_Partial_Block; ---------------------------------- -- Process_Last_Partial_Block -- ---------------------------------- procedure Process_Last_Partial_Block (Ctx : in out Context) with Global => null, Pre => State_Of (Ctx) = Updating, Post => (State_Of (Ctx) = Updating and Ctx.Partial_Block_Length = 0); ---------------------------------- -- Process_Last_Partial_Block -- ---------------------------------- procedure Process_Last_Partial_Block (Ctx : in out Context) is CV : Types.Byte_Array (0 .. CV_Size_Bytes - 1); begin if Ctx.Partial_Block_Length > 0 then SHAKE_Serial.Extract (Ctx.Partial_Block_CSHAKE, CV); CSHAKE_Serial.Update (Ctx.Outer_CSHAKE, CV); SHAKE_Serial.Init (Ctx.Partial_Block_CSHAKE); Ctx.Partial_Block_Length := 0; end if; end Process_Last_Partial_Block; ------------ -- Init -- ------------ procedure Init (Ctx : out Context; Block_Size : in Block_Size_Number; Customization : in String) is begin Ctx.Partial_Block_Length := 0; Ctx.Block_Size := Block_Size; Ctx.Input_Len := 0; Ctx.Finished := False; CSHAKE_Serial.Init (Ctx => Ctx.Outer_CSHAKE, Customization => Customization, Function_Name => "ParallelHash"); SHAKE_Serial.Init (Ctx.Partial_Block_CSHAKE); CSHAKE_Serial.Update (Ctx => Ctx.Outer_CSHAKE, Message => Util.Left_Encode_NIST (Block_Size)); end Init; -------------- -- Update -- -------------- procedure Update (Ctx : in out Context; Data : in Types.Byte_Array) is Initial_Bytes_Processed : constant Byte_Count := Num_Bytes_Processed (Ctx); Initial_Block_Size : constant Positive := Ctx.Block_Size; Remaining : Natural; Offset : Natural; Pos : Types.Index_Number; begin Add_To_Partial_Block (Ctx, Data, Offset); Remaining := Data'Length - Offset; if Remaining > 0 then pragma Assert (Ctx.Partial_Block_Length = 0); pragma Assert (Num_Bytes_Processed (Ctx) = Initial_Bytes_Processed + Byte_Count (Offset)); pragma Assert (Byte_Count (Remaining) <= Max_Input_Length (Ctx)); -- Process blocks of 8 in parallel while Remaining >= Ctx.Block_Size * 8 loop pragma Loop_Invariant (Offset + Remaining = Data'Length); pragma Loop_Invariant (State_Of (Ctx) = Updating); pragma Loop_Invariant (Ctx.Input_Len = Initial_Bytes_Processed + Byte_Count (Offset)); pragma Loop_Invariant (Byte_Count (Remaining) <= Byte_Count'Last - Ctx.Input_Len); pragma Loop_Invariant (Ctx.Partial_Block_Length = 0); pragma Loop_Invariant (Ctx.Block_Size = Initial_Block_Size); Pos := Data'First + Offset; Process_8_Parallel_Blocks (Ctx => Ctx, Data => Data (Pos .. Pos + ((Ctx.Block_Size * 8) - 1))); Ctx.Input_Len := Ctx.Input_Len + Byte_Count (Ctx.Block_Size * 8); Offset := Offset + (Ctx.Block_Size * 8); Remaining := Remaining - (Ctx.Block_Size * 8); end loop; pragma Assert_And_Cut (Offset + Remaining = Data'Length and State_Of (Ctx) = Updating and Num_Bytes_Processed (Ctx) = Initial_Bytes_Processed + Byte_Count (Offset) and Byte_Count (Remaining) <= Max_Input_Length (Ctx) and Ctx.Partial_Block_Length = 0 and Ctx.Block_Size = Initial_Block_Size and Remaining < Ctx.Block_Size * 8); -- Process blocks of 4 in parallel while Remaining >= Ctx.Block_Size * 4 loop pragma Loop_Invariant (Offset + Remaining = Data'Length); pragma Loop_Invariant (State_Of (Ctx) = Updating); pragma Loop_Invariant (Ctx.Input_Len = Initial_Bytes_Processed + Byte_Count (Offset)); pragma Loop_Invariant (Byte_Count (Remaining) <= Byte_Count'Last - Ctx.Input_Len); pragma Loop_Invariant (Ctx.Partial_Block_Length = 0); pragma Loop_Invariant (Ctx.Block_Size = Initial_Block_Size); Pos := Data'First + Offset; Process_4_Parallel_Blocks (Ctx => Ctx, Data => Data (Pos .. Pos + ((Ctx.Block_Size * 4) - 1))); Ctx.Input_Len := Ctx.Input_Len + Byte_Count (Ctx.Block_Size * 4); Offset := Offset + (Ctx.Block_Size * 4); Remaining := Remaining - (Ctx.Block_Size * 4); end loop; pragma Assert_And_Cut (Offset + Remaining = Data'Length and State_Of (Ctx) = Updating and Num_Bytes_Processed (Ctx) = Initial_Bytes_Processed + Byte_Count (Offset) and Byte_Count (Remaining) <= Max_Input_Length (Ctx) and Ctx.Partial_Block_Length = 0 and Ctx.Block_Size = Initial_Block_Size and Remaining < Ctx.Block_Size * 4); -- Process blocks of 2 in parallel while Remaining >= Ctx.Block_Size * 2 loop pragma Loop_Invariant (Offset + Remaining = Data'Length); pragma Loop_Invariant (State_Of (Ctx) = Updating); pragma Loop_Invariant (Ctx.Input_Len = Initial_Bytes_Processed + Byte_Count (Offset)); pragma Loop_Invariant (Byte_Count (Remaining) <= Byte_Count'Last - Ctx.Input_Len); pragma Loop_Invariant (Ctx.Partial_Block_Length = 0); pragma Loop_Invariant (Ctx.Block_Size = Initial_Block_Size); Pos := Data'First + Offset; Process_2_Parallel_Blocks (Ctx => Ctx, Data => Data (Pos .. Pos + ((Ctx.Block_Size * 2) - 1))); Ctx.Input_Len := Ctx.Input_Len + Byte_Count (Ctx.Block_Size * 2); Offset := Offset + (Ctx.Block_Size * 2); Remaining := Remaining - (Ctx.Block_Size * 2); end loop; pragma Assert_And_Cut (Offset + Remaining = Data'Length and State_Of (Ctx) = Updating and Num_Bytes_Processed (Ctx) = Initial_Bytes_Processed + Byte_Count (Offset) and Byte_Count (Remaining) <= Max_Input_Length (Ctx) and Ctx.Partial_Block_Length = 0 and Ctx.Block_Size = Initial_Block_Size and Remaining < Ctx.Block_Size * 2); -- Process single blocks if Remaining >= Ctx.Block_Size then Pos := Data'First + Offset; Process_1_Block (Ctx => Ctx, Data => Data (Pos .. Pos + (Ctx.Block_Size - 1))); Ctx.Input_Len := Ctx.Input_Len + Byte_Count (Ctx.Block_Size); Offset := Offset + Ctx.Block_Size; Remaining := Remaining - Ctx.Block_Size; end if; pragma Assert (Offset + Remaining = Data'Length); pragma Assert (State_Of (Ctx) = Updating); pragma Assert (Num_Bytes_Processed (Ctx) = Initial_Bytes_Processed + Byte_Count (Offset)); pragma Assert (Remaining < Ctx.Block_Size); -- Process remaining data. if Remaining > 0 then SHAKE_Serial.Update (Ctx => Ctx.Partial_Block_CSHAKE, Message => Data (Data'First + Offset .. Data'Last)); Ctx.Partial_Block_Length := Remaining; Ctx.Input_Len := Ctx.Input_Len + Byte_Count (Remaining); end if; end if; end Update; -------------- -- Finish -- -------------- procedure Finish (Ctx : in out Context; Data : out Types.Byte_Array) is Nb_Blocks : Long_Long_Integer; begin Nb_Blocks := Long_Long_Integer (Ctx.Input_Len) / Long_Long_Integer (Ctx.Block_Size); if Ctx.Partial_Block_Length > 0 then pragma Assert (Ctx.Block_Size > 1); pragma Assert (Nb_Blocks < Long_Long_Integer'Last); Nb_Blocks := Nb_Blocks + 1; end if; Process_Last_Partial_Block (Ctx); Ctx.Finished := True; CSHAKE_Serial.Update (Ctx => Ctx.Outer_CSHAKE, Message => Util.Right_Encode_NIST_Long_Long (Nb_Blocks)); CSHAKE_Serial.Update (Ctx => Ctx.Outer_CSHAKE, Message => Util.Right_Encode_NIST_Bit_Length (Data'Length)); CSHAKE_Serial.Extract (Ctx => Ctx.Outer_CSHAKE, Digest => Data); end Finish; --------------- -- Extract -- --------------- procedure Extract (Ctx : in out Context; Data : out Types.Byte_Array) is Nb_Blocks : Long_Long_Integer; begin if State_Of (Ctx) = Updating then Nb_Blocks := Long_Long_Integer (Ctx.Input_Len) / Long_Long_Integer (Ctx.Block_Size); if Ctx.Partial_Block_Length > 0 then pragma Assert (Ctx.Block_Size > 1); pragma Assert (Nb_Blocks < Long_Long_Integer'Last); Nb_Blocks := Nb_Blocks + 1; end if; Process_Last_Partial_Block (Ctx); CSHAKE_Serial.Update (Ctx => Ctx.Outer_CSHAKE, Message => Util.Right_Encode_NIST_Long_Long (Nb_Blocks)); CSHAKE_Serial.Update (Ctx => Ctx.Outer_CSHAKE, Message => Util.Right_Encode_NIST (0)); end if; CSHAKE_Serial.Extract (Ctx => Ctx.Outer_CSHAKE, Digest => Data); end Extract; end Keccak.Generic_Parallel_Hash;
wookey-project/ewok-legacy
Ada
34
ads
../../stm32f439/Ada/soc-syscfg.ads
reznikmm/gela
Ada
1,938
ads
------------------------------------------------------------------------------ -- G E L A G R A M M A R S -- -- Library for dealing with grammars for Gela project, -- -- a portable Ada compiler -- -- http://gela.ada-ru.org/ -- -- - - - - - - - - - - - - - - - -- -- Read copyright and license in gela.ads file -- ------------------------------------------------------------------------------ with League.Strings; with Anagram.Grammars; package AG_Tools is pragma Preelaborate; function To_Ada (Text : League.Strings.Universal_String) return League.Strings.Universal_String; -- Convert Text into an Ada identifier function Plural (Text : League.Strings.Universal_String) return League.Strings.Universal_String; -- Get Plural form of noun Text function Return_Type (G : Anagram.Grammars.Grammar; Part : Anagram.Grammars.Part) return League.Strings.Universal_String; -- Get identifier of type of given Part function Return_Type (G : Anagram.Grammars.Grammar; NT : Anagram.Grammars.Non_Terminal) return League.Strings.Universal_String; -- Get identifier of type of given Part function Package_Name (Name : League.Strings.Universal_String) return League.Strings.Universal_String; function Is_Converted_List (G : Anagram.Grammars.Grammar; NT : Anagram.Grammars.Non_Terminal) return Boolean; -- Detect if NT was a list before converting to plain AG function List_Item (G : Anagram.Grammars.Grammar; NT : Anagram.Grammars.Non_Terminal) return Anagram.Grammars.Non_Terminal_Index; -- Return items non-terminal for list, like NT={item} end AG_Tools;
zhmu/ananas
Ada
72,340
adb
------------------------------------------------------------------------------ -- -- -- GNAT RUN-TIME LIBRARY (GNARL) COMPONENTS -- -- -- -- S Y S T E M . T A S K I N G . S T A G E S -- -- -- -- B o d y -- -- -- -- Copyright (C) 1992-2022, Free Software Foundation, Inc. -- -- -- -- GNARL is free software; you can redistribute it and/or modify it under -- -- terms of the GNU General Public License as published by the Free Soft- -- -- ware Foundation; either version 3, or (at your option) any later ver- -- -- sion. GNAT is distributed in the hope that it will be useful, but WITH- -- -- OUT ANY WARRANTY; without even the implied warranty of MERCHANTABILITY -- -- or FITNESS FOR A PARTICULAR PURPOSE. -- -- -- -- As a special exception under Section 7 of GPL version 3, you are granted -- -- additional permissions described in the GCC Runtime Library Exception, -- -- version 3.1, as published by the Free Software Foundation. -- -- -- -- You should have received a copy of the GNU General Public License and -- -- a copy of the GCC Runtime Library Exception along with this program; -- -- see the files COPYING3 and COPYING.RUNTIME respectively. If not, see -- -- <http://www.gnu.org/licenses/>. -- -- -- -- GNARL was developed by the GNARL team at Florida State University. -- -- Extensive contributions were provided by Ada Core Technologies, Inc. -- -- -- ------------------------------------------------------------------------------ pragma Partition_Elaboration_Policy (Concurrent); -- This package only implements the concurrent elaboration policy. This pragma -- will enforce it (and detect conflicts with user specified policy). with Ada.Exceptions; with Ada.Unchecked_Deallocation; with Ada.Task_Initialization; with System.Interrupt_Management; with System.Tasking.Debug; with System.Address_Image; with System.Task_Primitives; with System.Task_Primitives.Operations; with System.Tasking.Utilities; with System.Tasking.Queuing; with System.Tasking.Rendezvous; with System.OS_Primitives; with System.Secondary_Stack; with System.Restrictions; with System.Standard_Library; with System.Stack_Usage; with System.Storage_Elements; with System.Soft_Links; -- These are procedure pointers to non-tasking routines that use task -- specific data. In the absence of tasking, these routines refer to global -- data. In the presence of tasking, they must be replaced with pointers to -- task-specific versions. Also used for Create_TSD, Destroy_TSD, Get_Current -- _Excep, Finalize_Library_Objects, Task_Termination, Handler. with System.Tasking.Initialization; pragma Elaborate_All (System.Tasking.Initialization); -- This insures that tasking is initialized if any tasks are created package body System.Tasking.Stages is package STPO renames System.Task_Primitives.Operations; package SSL renames System.Soft_Links; package SSE renames System.Storage_Elements; use Ada.Exceptions; use Secondary_Stack; use Task_Primitives; use Task_Primitives.Operations; ----------------------- -- Local Subprograms -- ----------------------- procedure Free is new Ada.Unchecked_Deallocation (Ada_Task_Control_Block, Task_Id); procedure Trace_Unhandled_Exception_In_Task (Self_Id : Task_Id); -- This procedure outputs the task specific message for exception -- tracing purposes. procedure Task_Wrapper (Self_ID : Task_Id); pragma Convention (C, Task_Wrapper); -- This is the procedure that is called by the GNULL from the new context -- when a task is created. It waits for activation and then calls the task -- body procedure. When the task body procedure completes, it terminates -- the task. -- -- The Task_Wrapper's address will be provided to the underlying threads -- library as the task entry point. Convention C is what makes most sense -- for that purpose (Export C would make the function globally visible, -- and affect the link name on which GDB depends). This will in addition -- trigger an automatic stack alignment suitable for GCC's assumptions if -- need be. -- "Vulnerable_..." in the procedure names below means they must be called -- with abort deferred. procedure Vulnerable_Complete_Task (Self_ID : Task_Id); -- Complete the calling task. This procedure must be called with -- abort deferred. It should only be called by Complete_Task and -- Finalize_Global_Tasks (for the environment task). procedure Vulnerable_Complete_Master (Self_ID : Task_Id); -- Complete the current master of the calling task. This procedure -- must be called with abort deferred. It should only be called by -- Vulnerable_Complete_Task and Complete_Master. procedure Vulnerable_Complete_Activation (Self_ID : Task_Id); -- Signal to Self_ID's activator that Self_ID has completed activation. -- This procedure must be called with abort deferred. procedure Abort_Dependents (Self_ID : Task_Id); -- Abort all the direct dependents of Self at its current master nesting -- level, plus all of their dependents, transitively. RTS_Lock should be -- locked by the caller. procedure Vulnerable_Free_Task (T : Task_Id); -- Recover all runtime system storage associated with the task T. This -- should only be called after T has terminated and will no longer be -- referenced. -- -- For tasks created by an allocator that fails, due to an exception, it is -- called from Expunge_Unactivated_Tasks. -- -- Different code is used at master completion, in Terminate_Dependents, -- due to a need for tighter synchronization with the master. ---------------------- -- Abort_Dependents -- ---------------------- procedure Abort_Dependents (Self_ID : Task_Id) is C : Task_Id; P : Task_Id; -- Each task C will take care of its own dependents, so there is no -- need to worry about them here. In fact, it would be wrong to abort -- indirect dependents here, because we can't distinguish between -- duplicate master ids. For example, suppose we have three nested -- task bodies T1,T2,T3. And suppose T1 also calls P which calls Q (and -- both P and Q are task masters). Q will have the same master id as -- Master_Of_Task of T3. Previous versions of this would abort T3 when -- Q calls Complete_Master, which was completely wrong. begin C := All_Tasks_List; while C /= null loop P := C.Common.Parent; if P = Self_ID then if C.Master_Of_Task = Self_ID.Master_Within then pragma Debug (Debug.Trace (Self_ID, "Aborting", 'X', C)); Utilities.Abort_One_Task (Self_ID, C); C.Dependents_Aborted := True; end if; end if; C := C.Common.All_Tasks_Link; end loop; Self_ID.Dependents_Aborted := True; end Abort_Dependents; ----------------- -- Abort_Tasks -- ----------------- procedure Abort_Tasks (Tasks : Task_List) is begin Utilities.Abort_Tasks (Tasks); end Abort_Tasks; -------------------- -- Activate_Tasks -- -------------------- -- Note that locks of activator and activated task are both locked here. -- This is necessary because C.Common.State and Self.Common.Wait_Count have -- to be synchronized. This is safe from deadlock because the activator is -- always created before the activated task. That satisfies our -- in-order-of-creation ATCB locking policy. -- At one point, we may also lock the parent, if the parent is different -- from the activator. That is also consistent with the lock ordering -- policy, since the activator cannot be created before the parent. -- Since we are holding both the activator's lock, and Task_Wrapper locks -- that before it does anything more than initialize the low-level ATCB -- components, it should be safe to wait to update the counts until we see -- that the thread creation is successful. -- If the thread creation fails, we do need to close the entries of the -- task. The first phase, of dequeuing calls, only requires locking the -- acceptor's ATCB, but the waking up of the callers requires locking the -- caller's ATCB. We cannot safely do this while we are holding other -- locks. Therefore, the queue-clearing operation is done in a separate -- pass over the activation chain. procedure Activate_Tasks (Chain_Access : Activation_Chain_Access) is Self_ID : constant Task_Id := STPO.Self; P : Task_Id; C : Task_Id; Next_C, Last_C : Task_Id; Activate_Prio : System.Any_Priority; Success : Boolean; All_Elaborated : Boolean := True; begin -- If pragma Detect_Blocking is active, then we must check whether this -- potentially blocking operation is called from a protected action. if System.Tasking.Detect_Blocking and then Self_ID.Common.Protected_Action_Nesting > 0 then raise Program_Error with "potentially blocking operation"; end if; pragma Debug (Debug.Trace (Self_ID, "Activate_Tasks", 'C')); Initialization.Defer_Abort_Nestable (Self_ID); pragma Assert (Self_ID.Common.Wait_Count = 0); -- Lock RTS_Lock, to prevent activated tasks from racing ahead before -- we finish activating the chain. Lock_RTS; -- Check that all task bodies have been elaborated C := Chain_Access.T_ID; Last_C := null; while C /= null loop if C.Common.Elaborated /= null and then not C.Common.Elaborated.all then All_Elaborated := False; end if; -- Reverse the activation chain so that tasks are activated in the -- same order they're declared. Next_C := C.Common.Activation_Link; C.Common.Activation_Link := Last_C; Last_C := C; C := Next_C; end loop; Chain_Access.T_ID := Last_C; if not All_Elaborated then Unlock_RTS; Initialization.Undefer_Abort_Nestable (Self_ID); raise Program_Error with "Some tasks have not been elaborated"; end if; -- Activate all the tasks in the chain. Creation of the thread of -- control was deferred until activation. So create it now. C := Chain_Access.T_ID; while C /= null loop if C.Common.State /= Terminated then pragma Assert (C.Common.State = Unactivated); P := C.Common.Parent; Write_Lock (P); Write_Lock (C); Activate_Prio := (if C.Common.Base_Priority < Get_Priority (Self_ID) then Get_Priority (Self_ID) else C.Common.Base_Priority); System.Task_Primitives.Operations.Create_Task (C, Task_Wrapper'Address, Parameters.Size_Type (C.Common.Compiler_Data.Pri_Stack_Info.Size), Activate_Prio, Success); -- There would be a race between the created task and the creator -- to do the following initialization, if we did not have a -- Lock/Unlock_RTS pair in the task wrapper to prevent it from -- racing ahead. if Success then C.Common.State := Activating; C.Awake_Count := 1; C.Alive_Count := 1; P.Awake_Count := P.Awake_Count + 1; P.Alive_Count := P.Alive_Count + 1; if P.Common.State = Master_Completion_Sleep and then C.Master_Of_Task = P.Master_Within then pragma Assert (Self_ID /= P); P.Common.Wait_Count := P.Common.Wait_Count + 1; end if; for J in System.Tasking.Debug.Known_Tasks'Range loop if System.Tasking.Debug.Known_Tasks (J) = null then System.Tasking.Debug.Known_Tasks (J) := C; C.Known_Tasks_Index := J; exit; end if; end loop; if Global_Task_Debug_Event_Set then Debug.Signal_Debug_Event (Debug.Debug_Event_Activating, C); end if; C.Common.State := Runnable; Unlock (C); Unlock (P); else -- No need to set Awake_Count, State, etc. here since the loop -- below will do that for any Unactivated tasks. Unlock (C); Unlock (P); Self_ID.Common.Activation_Failed := True; end if; end if; C := C.Common.Activation_Link; end loop; Unlock_RTS; -- Close the entries of any tasks that failed thread creation, and count -- those that have not finished activation. Write_Lock (Self_ID); Self_ID.Common.State := Activator_Sleep; C := Chain_Access.T_ID; while C /= null loop Write_Lock (C); if C.Common.State = Unactivated then C.Common.Activator := null; C.Common.State := Terminated; C.Callable := False; Utilities.Cancel_Queued_Entry_Calls (C); elsif C.Common.Activator /= null then Self_ID.Common.Wait_Count := Self_ID.Common.Wait_Count + 1; end if; Unlock (C); P := C.Common.Activation_Link; C.Common.Activation_Link := null; C := P; end loop; -- Wait for the activated tasks to complete activation. It is -- unsafe to abort any of these tasks until the count goes to zero. loop exit when Self_ID.Common.Wait_Count = 0; Sleep (Self_ID, Activator_Sleep); end loop; Self_ID.Common.State := Runnable; Unlock (Self_ID); -- Remove the tasks from the chain Chain_Access.T_ID := null; Initialization.Undefer_Abort_Nestable (Self_ID); if Self_ID.Common.Activation_Failed then Self_ID.Common.Activation_Failed := False; raise Tasking_Error with "Failure during activation"; end if; end Activate_Tasks; ------------------------- -- Complete_Activation -- ------------------------- procedure Complete_Activation is Self_ID : constant Task_Id := STPO.Self; begin Initialization.Defer_Abort_Nestable (Self_ID); Vulnerable_Complete_Activation (Self_ID); Initialization.Undefer_Abort_Nestable (Self_ID); -- ??? Why do we need to allow for nested deferral here? end Complete_Activation; --------------------- -- Complete_Master -- --------------------- procedure Complete_Master is Self_ID : constant Task_Id := STPO.Self; begin pragma Assert (Self_ID.Deferral_Level > 0 or else not System.Restrictions.Abort_Allowed); Vulnerable_Complete_Master (Self_ID); end Complete_Master; ------------------- -- Complete_Task -- ------------------- -- See comments on Vulnerable_Complete_Task for details procedure Complete_Task is Self_ID : constant Task_Id := STPO.Self; begin pragma Assert (Self_ID.Deferral_Level > 0 or else not System.Restrictions.Abort_Allowed); Vulnerable_Complete_Task (Self_ID); -- All of our dependents have terminated, never undefer abort again end Complete_Task; ----------------- -- Create_Task -- ----------------- -- Compiler interface only. Do not call from within the RTS. This must be -- called to create a new task. procedure Create_Task (Priority : Integer; Stack_Size : System.Parameters.Size_Type; Secondary_Stack_Size : System.Parameters.Size_Type; Task_Info : System.Task_Info.Task_Info_Type; CPU : Integer; Relative_Deadline : Ada.Real_Time.Time_Span; Domain : Dispatching_Domain_Access; Num_Entries : Task_Entry_Index; Master : Master_Level; State : Task_Procedure_Access; Discriminants : System.Address; Elaborated : Access_Boolean; Chain : in out Activation_Chain; Task_Image : String; Created_Task : out Task_Id) is T, P : Task_Id; Self_ID : constant Task_Id := STPO.Self; Success : Boolean; Base_Priority : System.Any_Priority; Len : Natural; Base_CPU : System.Multiprocessors.CPU_Range; use type System.Multiprocessors.CPU_Range; pragma Unreferenced (Relative_Deadline); -- EDF scheduling is not supported by any of the target platforms so -- this parameter is not passed any further. begin -- If Master is greater than the current master, it means that Master -- has already awaited its dependent tasks. This raises Program_Error, -- by 4.8(10.3/2). See AI-280. Ignore this check for foreign threads. if Self_ID.Master_Of_Task /= Foreign_Task_Level and then Master > Self_ID.Master_Within then raise Program_Error with "create task after awaiting termination"; end if; -- If pragma Detect_Blocking is active must be checked whether this -- potentially blocking operation is called from a protected action. if System.Tasking.Detect_Blocking and then Self_ID.Common.Protected_Action_Nesting > 0 then raise Program_Error with "potentially blocking operation"; end if; pragma Debug (Debug.Trace (Self_ID, "Create_Task", 'C')); Base_Priority := (if Priority = Unspecified_Priority then Self_ID.Common.Base_Priority else System.Any_Priority (Priority)); -- Legal values of CPU are the special Unspecified_CPU value which is -- inserted by the compiler for tasks without CPU aspect, and those in -- the range of CPU_Range but no greater than Number_Of_CPUs. Otherwise -- the task is defined to have failed, and it becomes a completed task -- (RM D.16(14/3)). if CPU /= Unspecified_CPU and then (CPU < Integer (System.Multiprocessors.CPU_Range'First) or else CPU > Integer (System.Multiprocessors.Number_Of_CPUs)) then raise Tasking_Error with "CPU not in range"; -- Normal CPU affinity else -- When the application code says nothing about the task affinity -- (task without CPU aspect) then the compiler inserts the value -- Unspecified_CPU which indicates to the run-time library that -- the task will activate and execute on the same processor as its -- activating task if the activating task is assigned a processor -- (RM D.16(14/3)). Base_CPU := (if CPU = Unspecified_CPU then Self_ID.Common.Base_CPU else System.Multiprocessors.CPU_Range (CPU)); end if; -- Find parent P of new Task, via master level number. Independent -- tasks should have Parent = Environment_Task, and all tasks created -- by independent tasks are also independent. See, for example, -- s-interr.adb, where Interrupt_Manager does "new Server_Task". The -- access type is at library level, so the parent of the Server_Task -- is Environment_Task. P := Self_ID; if P.Master_Of_Task <= Independent_Task_Level then P := Environment_Task; else while P /= null and then P.Master_Of_Task >= Master loop P := P.Common.Parent; end loop; end if; Initialization.Defer_Abort_Nestable (Self_ID); begin T := New_ATCB (Num_Entries); exception when others => Initialization.Undefer_Abort_Nestable (Self_ID); raise Storage_Error with "Cannot allocate task"; end; -- RTS_Lock is used by Abort_Dependents and Abort_Tasks. Up to this -- point, it is possible that we may be part of a family of tasks that -- is being aborted. Lock_RTS; Write_Lock (Self_ID); -- Now, we must check that we have not been aborted. If so, we should -- give up on creating this task, and simply return. if not Self_ID.Callable then pragma Assert (Self_ID.Pending_ATC_Level = Level_Completed_Task); pragma Assert (Self_ID.Pending_Action); pragma Assert (Chain.T_ID = null or else Chain.T_ID.Common.State = Unactivated); Unlock (Self_ID); Unlock_RTS; Initialization.Undefer_Abort_Nestable (Self_ID); -- ??? Should never get here pragma Assert (Standard.False); raise Standard'Abort_Signal; end if; Initialize_ATCB (Self_ID, State, Discriminants, P, Elaborated, Base_Priority, Base_CPU, Domain, Task_Info, Stack_Size, T, Success); if not Success then Free (T); Unlock (Self_ID); Unlock_RTS; Initialization.Undefer_Abort_Nestable (Self_ID); raise Storage_Error with "Failed to initialize task"; end if; if Master = Foreign_Task_Level + 2 then -- This should not happen, except when a foreign task creates non -- library-level Ada tasks. In this case, we pretend the master is -- a regular library level task, otherwise the run-time will get -- confused when waiting for these tasks to terminate. T.Master_Of_Task := Library_Task_Level; else T.Master_Of_Task := Master; end if; T.Master_Within := T.Master_Of_Task + 1; for L in T.Entry_Calls'Range loop T.Entry_Calls (L).Self := T; T.Entry_Calls (L).Level := L; end loop; if Task_Image'Length = 0 then T.Common.Task_Image_Len := 0; else Len := 1; T.Common.Task_Image (1) := Task_Image (Task_Image'First); -- Remove unwanted blank space generated by 'Image for J in Task_Image'First + 1 .. Task_Image'Last loop if Task_Image (J) /= ' ' or else Task_Image (J - 1) /= '(' then Len := Len + 1; T.Common.Task_Image (Len) := Task_Image (J); exit when Len = T.Common.Task_Image'Last; end if; end loop; T.Common.Task_Image_Len := Len; end if; -- Note: we used to have code here to initialize T.Common.Domain, but -- that is not needed, since this is initialized in System.Tasking. Unlock (Self_ID); Unlock_RTS; -- The CPU associated to the task (if any) must belong to the -- dispatching domain. if Base_CPU /= System.Multiprocessors.Not_A_Specific_CPU and then (Base_CPU not in T.Common.Domain'Range or else not T.Common.Domain (Base_CPU)) then Initialization.Undefer_Abort_Nestable (Self_ID); raise Tasking_Error with "CPU not in dispatching domain"; end if; -- To handle the interaction between pragma CPU and dispatching domains -- we need to signal that this task is being allocated to a processor. -- This is needed only for tasks belonging to the system domain (the -- creation of new dispatching domains can only take processors from the -- system domain) and only before the environment task calls the main -- procedure (dispatching domains cannot be created after this). if Base_CPU /= System.Multiprocessors.Not_A_Specific_CPU and then T.Common.Domain = System.Tasking.System_Domain and then not System.Tasking.Dispatching_Domains_Frozen then -- Increase the number of tasks attached to the CPU to which this -- task is being moved. Dispatching_Domain_Tasks (Base_CPU) := Dispatching_Domain_Tasks (Base_CPU) + 1; end if; -- Create the secondary stack for the task as early as possible during -- in the creation of a task, since it may be used by the operation of -- Ada code within the task. begin SSL.Create_TSD (T.Common.Compiler_Data, null, Secondary_Stack_Size); exception when others => Initialization.Undefer_Abort_Nestable (Self_ID); raise Storage_Error with "Secondary stack could not be allocated"; end; T.Common.Activation_Link := Chain.T_ID; Chain.T_ID := T; Created_Task := T; Initialization.Undefer_Abort_Nestable (Self_ID); pragma Debug (Debug.Trace (Self_ID, "Created task in " & T.Master_Of_Task'Img, 'C', T)); end Create_Task; -------------------- -- Current_Master -- -------------------- function Current_Master return Master_Level is begin return STPO.Self.Master_Within; end Current_Master; ------------------ -- Enter_Master -- ------------------ procedure Enter_Master is Self_ID : constant Task_Id := STPO.Self; begin Self_ID.Master_Within := Self_ID.Master_Within + 1; pragma Debug (Debug.Trace (Self_ID, "Enter_Master ->" & Self_ID.Master_Within'Img, 'M')); end Enter_Master; ------------------------------- -- Expunge_Unactivated_Tasks -- ------------------------------- -- See procedure Close_Entries for the general case procedure Expunge_Unactivated_Tasks (Chain : in out Activation_Chain) is Self_ID : constant Task_Id := STPO.Self; C : Task_Id; Call : Entry_Call_Link; Temp : Task_Id; begin pragma Debug (Debug.Trace (Self_ID, "Expunge_Unactivated_Tasks", 'C')); Initialization.Defer_Abort_Nestable (Self_ID); -- ??? -- Experimentation has shown that abort is sometimes (but not always) -- already deferred when this is called. -- That may indicate an error. Find out what is going on C := Chain.T_ID; while C /= null loop pragma Assert (C.Common.State = Unactivated); Temp := C.Common.Activation_Link; if C.Common.State = Unactivated then Lock_RTS; Write_Lock (C); for J in 1 .. C.Entry_Num loop Queuing.Dequeue_Head (C.Entry_Queues (J), Call); pragma Assert (Call = null); end loop; Unlock (C); Initialization.Remove_From_All_Tasks_List (C); Unlock_RTS; Vulnerable_Free_Task (C); C := Temp; end if; end loop; Chain.T_ID := null; Initialization.Undefer_Abort_Nestable (Self_ID); end Expunge_Unactivated_Tasks; --------------------------- -- Finalize_Global_Tasks -- --------------------------- -- ??? -- We have a potential problem here if finalization of global objects does -- anything with signals or the timer server, since by that time those -- servers have terminated. -- It is hard to see how that would occur -- However, a better solution might be to do all this finalization -- using the global finalization chain. procedure Finalize_Global_Tasks is Self_ID : constant Task_Id := STPO.Self; Ignore_1 : Boolean; Ignore_2 : Boolean; function State (Int : System.Interrupt_Management.Interrupt_ID) return Character; pragma Import (C, State, "__gnat_get_interrupt_state"); -- Get interrupt state for interrupt number Int. Defined in init.c Default : constant Character := 's'; -- 's' Interrupt_State pragma set state to System (use "default" -- system handler) begin if Self_ID.Deferral_Level = 0 then -- ??? -- In principle, we should be able to predict whether abort is -- already deferred here (and it should not be deferred yet but in -- practice it seems Finalize_Global_Tasks is being called sometimes, -- from RTS code for exceptions, with abort already deferred. Initialization.Defer_Abort_Nestable (Self_ID); -- Never undefer again end if; -- This code is only executed by the environment task pragma Assert (Self_ID = Environment_Task); -- Set Environment_Task'Callable to false to notify library-level tasks -- that it is waiting for them. Self_ID.Callable := False; -- Exit level 2 master, for normal tasks in library-level packages Complete_Master; -- Force termination of "independent" library-level server tasks Lock_RTS; Abort_Dependents (Self_ID); Unlock_RTS; -- We need to explicitly wait for the task to be terminated here -- because on true concurrent system, we may end this procedure before -- the tasks are really terminated. Write_Lock (Self_ID); -- If the Abort_Task signal is set to system, it means that we may -- not have been able to abort all independent tasks (in particular, -- Server_Task may be blocked, waiting for a signal), in which case, do -- not wait for Independent_Task_Count to go down to 0. We arbitrarily -- limit the number of loop iterations; if an independent task does not -- terminate, we do not want to hang here. In that case, the thread will -- be terminated when the process exits. if State (System.Interrupt_Management.Abort_Task_Interrupt) /= Default then for J in 1 .. 10 loop exit when Utilities.Independent_Task_Count = 0; -- We used to yield here, but this did not take into account low -- priority tasks that would cause dead lock in some cases (true -- FIFO scheduling). Timed_Sleep (Self_ID, 0.01, System.OS_Primitives.Relative, Self_ID.Common.State, Ignore_1, Ignore_2); end loop; end if; -- ??? On multi-processor environments, it seems that the above loop -- isn't sufficient, so we need to add an additional delay. Timed_Sleep (Self_ID, 0.01, System.OS_Primitives.Relative, Self_ID.Common.State, Ignore_1, Ignore_2); Unlock (Self_ID); -- Complete the environment task Vulnerable_Complete_Task (Self_ID); -- Handle normal task termination by the environment task, but only -- for the normal task termination. In the case of Abnormal and -- Unhandled_Exception they must have been handled before, and the -- task termination soft link must have been changed so the task -- termination routine is not executed twice. SSL.Task_Termination_Handler.all (Ada.Exceptions.Null_Occurrence); -- Finalize all library-level controlled objects if not SSL."=" (SSL.Finalize_Library_Objects, null) then SSL.Finalize_Library_Objects.all; end if; -- Reset the soft links to non-tasking SSL.Abort_Defer := SSL.Abort_Defer_NT'Access; SSL.Abort_Undefer := SSL.Abort_Undefer_NT'Access; SSL.Lock_Task := SSL.Task_Lock_NT'Access; SSL.Unlock_Task := SSL.Task_Unlock_NT'Access; SSL.Get_Jmpbuf_Address := SSL.Get_Jmpbuf_Address_NT'Access; SSL.Set_Jmpbuf_Address := SSL.Set_Jmpbuf_Address_NT'Access; SSL.Get_Sec_Stack := SSL.Get_Sec_Stack_NT'Access; SSL.Set_Sec_Stack := SSL.Set_Sec_Stack_NT'Access; SSL.Check_Abort_Status := SSL.Check_Abort_Status_NT'Access; SSL.Get_Stack_Info := SSL.Get_Stack_Info_NT'Access; -- Don't bother trying to finalize Initialization.Global_Task_Lock -- and System.Task_Primitives.RTS_Lock. end Finalize_Global_Tasks; --------------- -- Free_Task -- --------------- procedure Free_Task (T : Task_Id) is Self_Id : constant Task_Id := Self; begin Initialization.Task_Lock (Self_Id); if T.Common.State = Terminated then -- It is not safe to call Abort_Defer or Write_Lock at this stage Lock_RTS; Initialization.Finalize_Attributes (T); Initialization.Remove_From_All_Tasks_List (T); Unlock_RTS; Initialization.Task_Unlock (Self_Id); System.Task_Primitives.Operations.Finalize_TCB (T); else -- If the task is not terminated, then mark the task as to be freed -- upon termination. T.Free_On_Termination := True; Initialization.Task_Unlock (Self_Id); end if; end Free_Task; --------------------------- -- Move_Activation_Chain -- --------------------------- procedure Move_Activation_Chain (From, To : Activation_Chain_Access; New_Master : Master_ID) is Self_ID : constant Task_Id := STPO.Self; C : Task_Id; begin pragma Debug (Debug.Trace (Self_ID, "Move_Activation_Chain", 'C')); -- Nothing to do if From is empty, and we can check that without -- deferring aborts. C := From.all.T_ID; if C = null then return; end if; Initialization.Defer_Abort_Nestable (Self_ID); -- Loop through the From chain, changing their Master_Of_Task fields, -- and to find the end of the chain. loop C.Master_Of_Task := New_Master; exit when C.Common.Activation_Link = null; C := C.Common.Activation_Link; end loop; -- Hook From in at the start of To C.Common.Activation_Link := To.all.T_ID; To.all.T_ID := From.all.T_ID; -- Set From to empty From.all.T_ID := null; Initialization.Undefer_Abort_Nestable (Self_ID); end Move_Activation_Chain; ------------------ -- Task_Wrapper -- ------------------ -- The task wrapper is a procedure that is called first for each task body -- and which in turn calls the compiler-generated task body procedure. -- The wrapper's main job is to do initialization for the task. It also -- has some locally declared objects that serve as per-task local data. -- Task finalization is done by Complete_Task, which is called from an -- at-end handler that the compiler generates. procedure Task_Wrapper (Self_ID : Task_Id) is use System.Standard_Library; use System.Stack_Usage; Bottom_Of_Stack : aliased Integer; Task_Alternate_Stack : aliased SSE.Storage_Array (1 .. Alternate_Stack_Size); -- The alternate signal stack for this task, if any Use_Alternate_Stack : constant Boolean := Alternate_Stack_Size /= 0; -- Whether to use above alternate signal stack for stack overflows SEH_Table : aliased SSE.Storage_Array (1 .. 8); -- Structured Exception Registration table (2 words) procedure Install_SEH_Handler (Addr : System.Address); pragma Import (C, Install_SEH_Handler, "__gnat_install_SEH_handler"); -- Install the SEH (Structured Exception Handling) handler Cause : Cause_Of_Termination := Normal; -- Indicates the reason why this task terminates. Normal corresponds to -- a task terminating due to completing the last statement of its body, -- or as a result of waiting on a terminate alternative. If the task -- terminates because it is being aborted then Cause will be set -- to Abnormal. If the task terminates because of an exception -- raised by the execution of its task body, then Cause is set -- to Unhandled_Exception. EO : Exception_Occurrence; -- If the task terminates because of an exception raised by the -- execution of its task body, then EO will contain the associated -- exception occurrence. Otherwise, it will contain Null_Occurrence. TH : Termination_Handler := null; -- Pointer to the protected procedure to be executed upon task -- termination. procedure Search_Fall_Back_Handler (ID : Task_Id); -- Procedure that searches recursively a fall-back handler through the -- master relationship. If the handler is found, its pointer is stored -- in TH. It stops when the handler is found or when the ID is null. ------------------------------ -- Search_Fall_Back_Handler -- ------------------------------ procedure Search_Fall_Back_Handler (ID : Task_Id) is begin -- A null Task_Id indicates that we have reached the root of the -- task hierarchy and no handler has been found. if ID = null then return; -- If there is a fall back handler, store its pointer for later -- execution. elsif ID.Common.Fall_Back_Handler /= null then TH := ID.Common.Fall_Back_Handler; -- Otherwise look for a fall back handler in the parent else Search_Fall_Back_Handler (ID.Common.Parent); end if; end Search_Fall_Back_Handler; -- Start of processing for Task_Wrapper begin pragma Assert (Self_ID.Deferral_Level = 1); Debug.Master_Hook (Self_ID, Self_ID.Common.Parent, Self_ID.Master_Of_Task); if Use_Alternate_Stack then Self_ID.Common.Task_Alternate_Stack := Task_Alternate_Stack'Address; end if; -- Set the guard page at the bottom of the stack. The call to unprotect -- the page is done in Terminate_Task Stack_Guard (Self_ID, True); -- Initialize low-level TCB components, that cannot be initialized by -- the creator. Enter_Task sets Self_ID.LL.Thread. Enter_Task (Self_ID); -- Initialize dynamic stack usage if System.Stack_Usage.Is_Enabled then declare Guard_Page_Size : constant := 16 * 1024; -- Part of the stack used as a guard page. This is an OS dependent -- value, so we need to use the maximum. This value is only used -- when the stack address is known, that is currently Windows. Small_Overflow_Guard : constant := 12 * 1024; -- Note: this used to be 4K, but was changed to 12K, since -- smaller values resulted in segmentation faults from dynamic -- stack analysis. Big_Overflow_Guard : constant := 64 * 1024 + 8 * 1024; -- These two values are experimental, and seem to work on most -- platforms. They still need to be analyzed further. They also -- need documentation, what are they and why does the logic differ -- depending on whether the stack is large or small??? Pattern_Size : Natural := Natural (Self_ID.Common. Compiler_Data.Pri_Stack_Info.Size); -- Size of the pattern Stack_Base : Address; -- Address of the base of the stack begin Stack_Base := Self_ID.Common.Compiler_Data.Pri_Stack_Info.Base; if Stack_Base = Null_Address then -- On many platforms, we don't know the real stack base -- address. Estimate it using an address in the frame. Stack_Base := Bottom_Of_Stack'Address; -- Adjustments for inner frames Pattern_Size := Pattern_Size - (if Pattern_Size < Big_Overflow_Guard then Small_Overflow_Guard else Big_Overflow_Guard); else -- Reduce by the size of the final guard page Pattern_Size := Pattern_Size - Guard_Page_Size; end if; STPO.Lock_RTS; Initialize_Analyzer (Self_ID.Common.Analyzer, Self_ID.Common.Task_Image (1 .. Self_ID.Common.Task_Image_Len), Natural (Self_ID.Common.Compiler_Data.Pri_Stack_Info.Size), SSE.To_Integer (Stack_Base), Pattern_Size); STPO.Unlock_RTS; Fill_Stack (Self_ID.Common.Analyzer); end; end if; -- We setup the SEH (Structured Exception Handling) handler if supported -- on the target. Install_SEH_Handler (SEH_Table'Address); -- Initialize exception occurrence Save_Occurrence (EO, Ada.Exceptions.Null_Occurrence); -- We lock RTS_Lock to wait for activator to finish activating the rest -- of the chain, so that everyone in the chain comes out in priority -- order. -- This also protects the value of -- Self_ID.Common.Activator.Common.Wait_Count. Lock_RTS; Unlock_RTS; if not System.Restrictions.Abort_Allowed then -- If Abort is not allowed, reset the deferral level since it will -- not get changed by the generated code. Keeping a default value -- of one would prevent some operations (e.g. select or delay) to -- proceed successfully. Self_ID.Deferral_Level := 0; end if; if Global_Task_Debug_Event_Set then Debug.Signal_Debug_Event (Debug.Debug_Event_Run, Self_ID); end if; declare use Ada.Task_Initialization; Global_Initialization_Handler : Initialization_Handler; pragma Atomic (Global_Initialization_Handler); pragma Import (Ada, Global_Initialization_Handler, "__gnat_global_initialization_handler"); begin -- We are separating the following portion of the code in order to -- place the exception handlers in a different block. In this way, -- we do not call Set_Jmpbuf_Address (which needs Self) before we -- set Self in Enter_Task -- Call the initialization hook if any if Global_Initialization_Handler /= null then Global_Initialization_Handler.all; end if; -- Call the task body procedure -- The task body is called with abort still deferred. That -- eliminates a dangerous window, for which we had to patch-up in -- Terminate_Task. -- During the expansion of the task body, we insert an RTS-call -- to Abort_Undefer, at the first point where abort should be -- allowed. Self_ID.Common.Task_Entry_Point (Self_ID.Common.Task_Arg); Initialization.Defer_Abort_Nestable (Self_ID); exception -- We can't call Terminate_Task in the exception handlers below, -- since there may be (e.g. in the case of GCC exception handling) -- clean ups associated with the exception handler that need to -- access task specific data. -- Defer abort so that this task can't be aborted while exiting when Standard'Abort_Signal => Initialization.Defer_Abort_Nestable (Self_ID); -- Update the cause that motivated the task termination so that -- the appropriate information is passed to the task termination -- procedure. Task termination as a result of waiting on a -- terminate alternative is a normal termination, although it is -- implemented using the abort mechanisms. if Self_ID.Terminate_Alternative then Cause := Normal; if Global_Task_Debug_Event_Set then Debug.Signal_Debug_Event (Debug.Debug_Event_Terminated, Self_ID); end if; else Cause := Abnormal; if Global_Task_Debug_Event_Set then Debug.Signal_Debug_Event (Debug.Debug_Event_Abort_Terminated, Self_ID); end if; end if; when others => -- ??? Using an E : others here causes CD2C11A to fail on Tru64 Initialization.Defer_Abort_Nestable (Self_ID); -- Perform the task specific exception tracing duty. We handle -- these outputs here and not in the common notification routine -- because we need access to tasking related data and we don't -- want to drag dependencies against tasking related units in the -- the common notification units. Additionally, no trace is ever -- triggered from the common routine for the Unhandled_Raise case -- in tasks, since an exception never appears unhandled in this -- context because of this handler. if Exception_Trace = Unhandled_Raise then Trace_Unhandled_Exception_In_Task (Self_ID); end if; -- Update the cause that motivated the task termination so that -- the appropriate information is passed to the task termination -- procedure, as well as the associated Exception_Occurrence. Cause := Unhandled_Exception; Save_Occurrence (EO, SSL.Get_Current_Excep.all.all); if Global_Task_Debug_Event_Set then Debug.Signal_Debug_Event (Debug.Debug_Event_Exception_Terminated, Self_ID); end if; end; -- Look for a task termination handler. This code is for all tasks but -- the environment task. The task termination code for the environment -- task is executed by SSL.Task_Termination_Handler. Write_Lock (Self_ID); if Self_ID.Common.Specific_Handler /= null then TH := Self_ID.Common.Specific_Handler; -- Independent tasks should not call the Fall_Back_Handler (of the -- environment task), because they are implementation artifacts that -- should be invisible to Ada programs. elsif Self_ID.Master_Of_Task /= Independent_Task_Level then -- Look for a fall-back handler following the master relationship -- for the task. As specified in ARM C.7.3 par. 9/2, "the fall-back -- handler applies only to the dependent tasks of the task". Hence, -- if the terminating tasks (Self_ID) had a fall-back handler, it -- would not apply to itself, so we start the search with the parent. Search_Fall_Back_Handler (Self_ID.Common.Parent); end if; Unlock (Self_ID); -- Execute the task termination handler if we found it if TH /= null then begin TH.all (Cause, Self_ID, EO); exception -- RM-C.7.3 requires all exceptions raised here to be ignored when others => null; end; end if; if System.Stack_Usage.Is_Enabled then Compute_Result (Self_ID.Common.Analyzer); Report_Result (Self_ID.Common.Analyzer); end if; Terminate_Task (Self_ID); end Task_Wrapper; -------------------- -- Terminate_Task -- -------------------- -- Before we allow the thread to exit, we must clean up. This is a delicate -- job. We must wake up the task's master, who may immediately try to -- deallocate the ATCB from the current task WHILE IT IS STILL EXECUTING. -- To avoid this, the parent task must be blocked up to the latest -- statement executed. The trouble is that we have another step that we -- also want to postpone to the very end, i.e., calling SSL.Destroy_TSD. -- We have to postpone that until the end because compiler-generated code -- is likely to try to access that data at just about any point. -- We can't call Destroy_TSD while we are holding any other locks, because -- it locks Global_Task_Lock, and our deadlock prevention rules require -- that to be the outermost lock. Our first "solution" was to just lock -- Global_Task_Lock in addition to the other locks, and force the parent to -- also lock this lock between its wakeup and its freeing of the ATCB. See -- Complete_Task for the parent-side of the code that has the matching -- calls to Task_Lock and Task_Unlock. That was not really a solution, -- since the operation Task_Unlock continued to access the ATCB after -- unlocking, after which the parent was observed to race ahead, deallocate -- the ATCB, and then reallocate it to another task. The call to -- Undefer_Abort in Task_Unlock by the "terminated" task was overwriting -- the data of the new task that reused the ATCB. To solve this problem, we -- introduced the new operation Final_Task_Unlock. procedure Terminate_Task (Self_ID : Task_Id) is Environment_Task : constant Task_Id := STPO.Environment_Task; Master_Of_Task : Integer; Deallocate : Boolean; begin Debug.Task_Termination_Hook; -- Since GCC cannot allocate stack chunks efficiently without reordering -- some of the allocations, we have to handle this unexpected situation -- here. Normally we never have to call Vulnerable_Complete_Task here. if Self_ID.Common.Activator /= null then Vulnerable_Complete_Task (Self_ID); end if; Initialization.Task_Lock (Self_ID); Master_Of_Task := Self_ID.Master_Of_Task; -- Check if the current task is an independent task If so, decrement -- the Independent_Task_Count value. if Master_Of_Task = Independent_Task_Level then Write_Lock (Environment_Task); Utilities.Independent_Task_Count := Utilities.Independent_Task_Count - 1; Unlock (Environment_Task); end if; -- Unprotect the guard page if needed Stack_Guard (Self_ID, False); Utilities.Make_Passive (Self_ID, Task_Completed => True); Deallocate := Self_ID.Free_On_Termination; pragma Assert (Check_Exit (Self_ID)); SSL.Destroy_TSD (Self_ID.Common.Compiler_Data); Initialization.Final_Task_Unlock (Self_ID); -- WARNING: past this point, this thread must assume that the ATCB has -- been deallocated, and can't access it anymore (which is why we have -- saved the Free_On_Termination flag in a temporary variable). if Deallocate then Free_Task (Self_ID); end if; if Master_Of_Task > 0 then STPO.Exit_Task; end if; end Terminate_Task; ---------------- -- Terminated -- ---------------- function Terminated (T : Task_Id) return Boolean is Self_ID : constant Task_Id := STPO.Self; Result : Boolean; begin Initialization.Defer_Abort_Nestable (Self_ID); Write_Lock (T); Result := T.Common.State = Terminated; Unlock (T); Initialization.Undefer_Abort_Nestable (Self_ID); return Result; end Terminated; ---------------------------------------- -- Trace_Unhandled_Exception_In_Task -- ---------------------------------------- procedure Trace_Unhandled_Exception_In_Task (Self_Id : Task_Id) is procedure To_Stderr (S : String); pragma Import (Ada, To_Stderr, "__gnat_to_stderr"); use System.Soft_Links; function To_Address is new Ada.Unchecked_Conversion (Task_Id, System.Task_Primitives.Task_Address); Excep : constant Exception_Occurrence_Access := SSL.Get_Current_Excep.all; begin -- This procedure is called by the task outermost handler in -- Task_Wrapper below, so only once the task stack has been fully -- unwound. The common notification routine has been called at the -- raise point already. -- Lock to prevent unsynchronized output Initialization.Task_Lock (Self_Id); To_Stderr ("task "); if Self_Id.Common.Task_Image_Len /= 0 then To_Stderr (Self_Id.Common.Task_Image (1 .. Self_Id.Common.Task_Image_Len)); To_Stderr ("_"); end if; To_Stderr (System.Address_Image (To_Address (Self_Id))); To_Stderr (" terminated by unhandled exception"); To_Stderr ([ASCII.LF]); To_Stderr (Exception_Information (Excep.all)); Initialization.Task_Unlock (Self_Id); end Trace_Unhandled_Exception_In_Task; ------------------------------------ -- Vulnerable_Complete_Activation -- ------------------------------------ -- As in several other places, the locks of the activator and activated -- task are both locked here. This follows our deadlock prevention lock -- ordering policy, since the activated task must be created after the -- activator. procedure Vulnerable_Complete_Activation (Self_ID : Task_Id) is Activator : constant Task_Id := Self_ID.Common.Activator; begin pragma Debug (Debug.Trace (Self_ID, "V_Complete_Activation", 'C')); Write_Lock (Activator); Write_Lock (Self_ID); pragma Assert (Self_ID.Common.Activator /= null); -- Remove dangling reference to Activator, since a task may outlive its -- activator. Self_ID.Common.Activator := null; -- Wake up the activator, if it is waiting for a chain of tasks to -- activate, and we are the last in the chain to complete activation. if Activator.Common.State = Activator_Sleep then Activator.Common.Wait_Count := Activator.Common.Wait_Count - 1; if Activator.Common.Wait_Count = 0 then Wakeup (Activator, Activator_Sleep); end if; end if; -- The activator raises a Tasking_Error if any task it is activating -- is completed before the activation is done. However, if the reason -- for the task completion is an abort, we do not raise an exception. -- See RM 9.2(5). if not Self_ID.Callable and then Self_ID.Pending_ATC_Level /= Level_Completed_Task then Activator.Common.Activation_Failed := True; end if; Unlock (Self_ID); Unlock (Activator); -- After the activation, active priority should be the same as base -- priority. We must unlock the Activator first, though, since it -- should not wait if we have lower priority. if Get_Priority (Self_ID) /= Self_ID.Common.Base_Priority then Write_Lock (Self_ID); Set_Priority (Self_ID, Self_ID.Common.Base_Priority); Unlock (Self_ID); end if; end Vulnerable_Complete_Activation; -------------------------------- -- Vulnerable_Complete_Master -- -------------------------------- procedure Vulnerable_Complete_Master (Self_ID : Task_Id) is C : Task_Id; P : Task_Id; CM : constant Master_Level := Self_ID.Master_Within; T : aliased Task_Id; To_Be_Freed : Task_Id; -- This is a list of ATCBs to be freed, after we have released all RTS -- locks. This is necessary because of the locking order rules, since -- the storage manager uses Global_Task_Lock. pragma Warnings (Off); function Check_Unactivated_Tasks return Boolean; pragma Warnings (On); -- Temporary error-checking code below. This is part of the checks -- added in the new run time. Call it only inside a pragma Assert. ----------------------------- -- Check_Unactivated_Tasks -- ----------------------------- function Check_Unactivated_Tasks return Boolean is begin Lock_RTS; Write_Lock (Self_ID); C := All_Tasks_List; while C /= null loop if C.Common.Activator = Self_ID and then C.Master_Of_Task = CM then return False; end if; if C.Common.Parent = Self_ID and then C.Master_Of_Task = CM then Write_Lock (C); if C.Common.State = Unactivated then return False; end if; Unlock (C); end if; C := C.Common.All_Tasks_Link; end loop; Unlock (Self_ID); Unlock_RTS; return True; end Check_Unactivated_Tasks; -- Start of processing for Vulnerable_Complete_Master begin pragma Debug (Debug.Trace (Self_ID, "V_Complete_Master(" & CM'Img & ")", 'C')); pragma Assert (Self_ID.Common.Wait_Count = 0); pragma Assert (Self_ID.Deferral_Level > 0 or else not System.Restrictions.Abort_Allowed); -- Count how many active dependent tasks this master currently has, and -- record this in Wait_Count. -- This count should start at zero, since it is initialized to zero for -- new tasks, and the task should not exit the sleep-loops that use this -- count until the count reaches zero. -- While we're counting, if we run across any unactivated tasks that -- belong to this master, we summarily terminate them as required by -- RM-9.2(6). Lock_RTS; Write_Lock (Self_ID); C := All_Tasks_List; while C /= null loop -- Terminate unactivated (never-to-be activated) tasks if C.Common.Activator = Self_ID and then C.Master_Of_Task = CM then -- Usually, C.Common.Activator = Self_ID implies C.Master_Of_Task -- = CM. The only case where C is pending activation by this -- task, but the master of C is not CM is in Ada 2005, when C is -- part of a return object of a build-in-place function. pragma Assert (C.Common.State = Unactivated); Write_Lock (C); C.Common.Activator := null; C.Common.State := Terminated; C.Callable := False; Utilities.Cancel_Queued_Entry_Calls (C); Unlock (C); end if; -- Count it if directly dependent on this master if C.Common.Parent = Self_ID and then C.Master_Of_Task = CM then Write_Lock (C); if C.Awake_Count /= 0 then Self_ID.Common.Wait_Count := Self_ID.Common.Wait_Count + 1; end if; Unlock (C); end if; C := C.Common.All_Tasks_Link; end loop; Self_ID.Common.State := Master_Completion_Sleep; Unlock (Self_ID); Unlock_RTS; -- Wait until dependent tasks are all terminated or ready to terminate. -- While waiting, the task may be awakened if the task's priority needs -- changing, or this master is aborted. In the latter case, we abort the -- dependents, and resume waiting until Wait_Count goes to zero. Write_Lock (Self_ID); loop exit when Self_ID.Common.Wait_Count = 0; -- Here is a difference as compared to Complete_Master if Self_ID.Pending_ATC_Level < Self_ID.ATC_Nesting_Level and then not Self_ID.Dependents_Aborted then Unlock (Self_ID); Lock_RTS; Abort_Dependents (Self_ID); Unlock_RTS; Write_Lock (Self_ID); else pragma Debug (Debug.Trace (Self_ID, "master_completion_sleep", 'C')); Sleep (Self_ID, Master_Completion_Sleep); end if; end loop; Self_ID.Common.State := Runnable; Unlock (Self_ID); -- Dependents are all terminated or on terminate alternatives. Now, -- force those on terminate alternatives to terminate, by aborting them. pragma Assert (Check_Unactivated_Tasks); if Self_ID.Alive_Count > 1 then -- ??? -- Consider finding a way to skip the following extra steps if there -- are no dependents with terminate alternatives. This could be done -- by adding another count to the ATCB, similar to Awake_Count, but -- keeping track of tasks that are on terminate alternatives. pragma Assert (Self_ID.Common.Wait_Count = 0); -- Force any remaining dependents to terminate by aborting them Lock_RTS; Abort_Dependents (Self_ID); -- Above, when we "abort" the dependents we are simply using this -- operation for convenience. We are not required to support the full -- abort-statement semantics; in particular, we are not required to -- immediately cancel any queued or in-service entry calls. That is -- good, because if we tried to cancel a call we would need to lock -- the caller, in order to wake the caller up. Our anti-deadlock -- rules prevent us from doing that without releasing the locks on C -- and Self_ID. Releasing and retaking those locks would be wasteful -- at best, and should not be considered further without more -- detailed analysis of potential concurrent accesses to the ATCBs -- of C and Self_ID. -- Count how many "alive" dependent tasks this master currently has, -- and record this in Wait_Count. This count should start at zero, -- since it is initialized to zero for new tasks, and the task should -- not exit the sleep-loops that use this count until the count -- reaches zero. pragma Assert (Self_ID.Common.Wait_Count = 0); Write_Lock (Self_ID); C := All_Tasks_List; while C /= null loop if C.Common.Parent = Self_ID and then C.Master_Of_Task = CM then Write_Lock (C); pragma Assert (C.Awake_Count = 0); if C.Alive_Count > 0 then pragma Assert (C.Terminate_Alternative); Self_ID.Common.Wait_Count := Self_ID.Common.Wait_Count + 1; end if; Unlock (C); end if; C := C.Common.All_Tasks_Link; end loop; Self_ID.Common.State := Master_Phase_2_Sleep; Unlock (Self_ID); Unlock_RTS; -- Wait for all counted tasks to finish terminating themselves Write_Lock (Self_ID); loop exit when Self_ID.Common.Wait_Count = 0; Sleep (Self_ID, Master_Phase_2_Sleep); end loop; Self_ID.Common.State := Runnable; Unlock (Self_ID); end if; -- We don't wake up for abort here. We are already terminating just as -- fast as we can, so there is no point. -- Remove terminated tasks from the list of Self_ID's dependents, but -- don't free their ATCBs yet, because of lock order restrictions, which -- don't allow us to call "free" or "malloc" while holding any other -- locks. Instead, we put those ATCBs to be freed onto a temporary list, -- called To_Be_Freed. Lock_RTS; C := All_Tasks_List; P := null; while C /= null loop -- If Free_On_Termination is set, do nothing here, and let the -- task free itself if not already done, otherwise we risk a race -- condition where Vulnerable_Free_Task is called in the loop below, -- while the task calls Free_Task itself, in Terminate_Task. if C.Common.Parent = Self_ID and then C.Master_Of_Task >= CM and then not C.Free_On_Termination then if P /= null then P.Common.All_Tasks_Link := C.Common.All_Tasks_Link; else All_Tasks_List := C.Common.All_Tasks_Link; end if; T := C.Common.All_Tasks_Link; C.Common.All_Tasks_Link := To_Be_Freed; To_Be_Freed := C; C := T; else P := C; C := C.Common.All_Tasks_Link; end if; end loop; Unlock_RTS; -- Free all the ATCBs on the list To_Be_Freed -- The ATCBs in the list are no longer in All_Tasks_List, and after -- any interrupt entries are detached from them they should no longer -- be referenced. -- Global_Task_Lock (Task_Lock/Unlock) is locked in the loop below to -- avoid a race between a terminating task and its parent. The parent -- might try to deallocate the ACTB out from underneath the exiting -- task. Note that Free will also lock Global_Task_Lock, but that is -- OK, since this is the *one* lock for which we have a mechanism to -- support nested locking. See Task_Wrapper and its finalizer for more -- explanation. -- ??? -- The check "T.Common.Parent /= null ..." below is to prevent dangling -- references to terminated library-level tasks, which could otherwise -- occur during finalization of library-level objects. A better solution -- might be to hook task objects into the finalization chain and -- deallocate the ATCB when the task object is deallocated. However, -- this change is not likely to gain anything significant, since all -- this storage should be recovered en-masse when the process exits. while To_Be_Freed /= null loop T := To_Be_Freed; To_Be_Freed := T.Common.All_Tasks_Link; -- ??? On SGI there is currently no Interrupt_Manager, that's why we -- need to check if the Interrupt_Manager_ID is null. if T.Interrupt_Entry and then Interrupt_Manager_ID /= null then declare Detach_Interrupt_Entries_Index : constant Task_Entry_Index := 1; -- Corresponds to the entry index of System.Interrupts. -- Interrupt_Manager.Detach_Interrupt_Entries. Be sure -- to update this value when changing Interrupt_Manager specs. type Param_Type is access all Task_Id; Param : aliased Param_Type := T'Access; begin System.Tasking.Rendezvous.Call_Simple (Interrupt_Manager_ID, Detach_Interrupt_Entries_Index, Param'Address); end; end if; if (T.Common.Parent /= null and then T.Common.Parent.Common.Parent /= null) or else T.Master_Of_Task > Library_Task_Level then Initialization.Task_Lock (Self_ID); -- If Sec_Stack_Ptr is not null, it means that Destroy_TSD -- has not been called yet (case of an unactivated task). if T.Common.Compiler_Data.Sec_Stack_Ptr /= null then SSL.Destroy_TSD (T.Common.Compiler_Data); end if; Vulnerable_Free_Task (T); Initialization.Task_Unlock (Self_ID); end if; end loop; -- It might seem nice to let the terminated task deallocate its own -- ATCB. That would not cover the case of unactivated tasks. It also -- would force us to keep the underlying thread around past termination, -- since references to the ATCB are possible past termination. -- Currently, we get rid of the thread as soon as the task terminates, -- and let the parent recover the ATCB later. -- Some day, if we want to recover the ATCB earlier, at task -- termination, we could consider using "fat task IDs", that include the -- serial number with the ATCB pointer, to catch references to tasks -- that no longer have ATCBs. It is not clear how much this would gain, -- since the user-level task object would still be occupying storage. -- Make next master level up active. We don't need to lock the ATCB, -- since the value is only updated by each task for itself. Self_ID.Master_Within := CM - 1; Debug.Master_Completed_Hook (Self_ID, CM); end Vulnerable_Complete_Master; ------------------------------ -- Vulnerable_Complete_Task -- ------------------------------ -- Complete the calling task -- This procedure must be called with abort deferred. It should only be -- called by Complete_Task and Finalize_Global_Tasks (for the environment -- task). -- The effect is similar to that of Complete_Master. Differences include -- the closing of entries here, and computation of the number of active -- dependent tasks in Complete_Master. -- We don't lock Self_ID before the call to Vulnerable_Complete_Activation, -- because that does its own locking, and because we do not need the lock -- to test Self_ID.Common.Activator. That value should only be read and -- modified by Self. procedure Vulnerable_Complete_Task (Self_ID : Task_Id) is begin pragma Assert (Self_ID.Deferral_Level > 0 or else not System.Restrictions.Abort_Allowed); pragma Assert (Self_ID = Self); pragma Assert (Self_ID.Master_Within in Self_ID.Master_Of_Task .. Self_ID.Master_Of_Task + 3); pragma Assert (Self_ID.Common.Wait_Count = 0); pragma Assert (Self_ID.Open_Accepts = null); pragma Assert (Self_ID.ATC_Nesting_Level = Level_No_ATC_Occurring); pragma Debug (Debug.Trace (Self_ID, "V_Complete_Task", 'C')); Write_Lock (Self_ID); Self_ID.Callable := False; -- In theory, Self should have no pending entry calls left on its -- call-stack. Each async. select statement should clean its own call, -- and blocking entry calls should defer abort until the calls are -- cancelled, then clean up. Utilities.Cancel_Queued_Entry_Calls (Self_ID); Unlock (Self_ID); if Self_ID.Common.Activator /= null then Vulnerable_Complete_Activation (Self_ID); end if; -- If Self_ID.Master_Within = Self_ID.Master_Of_Task + 2 we may have -- dependent tasks for which we need to wait. Otherwise we just exit. if Self_ID.Master_Within = Self_ID.Master_Of_Task + 2 then Vulnerable_Complete_Master (Self_ID); end if; end Vulnerable_Complete_Task; -------------------------- -- Vulnerable_Free_Task -- -------------------------- -- Recover all runtime system storage associated with the task T. This -- should only be called after T has terminated and will no longer be -- referenced. -- For tasks created by an allocator that fails, due to an exception, it -- is called from Expunge_Unactivated_Tasks. -- For tasks created by elaboration of task object declarations it is -- called from the finalization code of the Task_Wrapper procedure. procedure Vulnerable_Free_Task (T : Task_Id) is begin pragma Debug (Debug.Trace (Self, "Vulnerable_Free_Task", 'C', T)); Write_Lock (T); Initialization.Finalize_Attributes (T); Unlock (T); System.Task_Primitives.Operations.Finalize_TCB (T); end Vulnerable_Free_Task; -- Package elaboration code begin -- Establish the Adafinal softlink -- This is not done inside the central RTS initialization routine -- to avoid with'ing this package from System.Tasking.Initialization. SSL.Adafinal := Finalize_Global_Tasks'Access; -- Establish soft links for subprograms that manipulate master_id's. -- This cannot be done when the RTS is initialized, because of various -- elaboration constraints. SSL.Current_Master := Stages.Current_Master'Access; SSL.Enter_Master := Stages.Enter_Master'Access; SSL.Complete_Master := Stages.Complete_Master'Access; end System.Tasking.Stages;
zhmu/ananas
Ada
258
adb
-- { dg-do run } with Max_Size_Pkg; use Max_Size_Pkg; procedure Max_Size is begin if Arr1'Max_Size_In_Storage_Elements /= 7 then raise Program_Error; end if; if Arr2'Max_Size_In_Storage_Elements /= 24 then raise Program_Error; end if; end;
OneWingedShark/Byron
Ada
183
ads
Pragma Ada_2012; Pragma Assertion_Policy( Check ); With Lexington.Token_Vector_Pkg; -- Generate li_String tokens. Procedure Lexington.Aux.P7(Data : in out Token_Vector_Pkg.Vector);
stcarrez/ada-keystore
Ada
3,769
ads
----------------------------------------------------------------------- -- keystore-io-headers -- Keystore file header operations -- Copyright (C) 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 Util.Encoders.SHA256; with Keystore.Buffers; package Keystore.IO.Headers is type Wallet_Storage is record Identifier : Storage_Identifier; Pos : Block_Index; Kind : Interfaces.Unsigned_16; Readonly : Boolean := False; Sealed : Boolean := False; Max_Block : Natural := 0; HMAC : Util.Encoders.SHA256.Hash_Array; end record; type Wallet_Header is limited record UUID : UUID_Type; Identifier : Storage_Identifier; Version : Natural := 0; Block_Size : Natural := 0; Data_Count : Keystore.Header_Slot_Count_Type := 0; Header_Last_Pos : Block_Index; Storage_Count : Natural := 0; HMAC : Util.Encoders.SHA256.Hash_Array; Buffer : Keystore.Buffers.Storage_Buffer; end record; -- Build a new header with the given UUID and for the storage. -- The header buffer is allocated and filled so that it can be written by Write_Header. procedure Build_Header (UUID : in UUID_Type; Storage : in Storage_Identifier; Header : in out Wallet_Header); -- Read the header block and verify its integrity. procedure Read_Header (Header : in out Wallet_Header); -- Scan the header block for the storage and call the Process procedure for each -- storage information found in the header block. procedure Scan_Storage (Header : in out Wallet_Header; Process : not null access procedure (Storage : in Wallet_Storage)); -- Sign the header block for the storage. procedure Sign_Header (Header : in out Wallet_Header; Sign : in Secret_Key); -- Set some header data in the keystore file. procedure Set_Header_Data (Header : in out Wallet_Header; Index : in Header_Slot_Index_Type; Kind : in Header_Slot_Type; Data : in Ada.Streams.Stream_Element_Array); -- Get the header data information from the keystore file. procedure Get_Header_Data (Header : in out Wallet_Header; Index : in Header_Slot_Index_Type; Kind : out Header_Slot_Type; Data : out Ada.Streams.Stream_Element_Array; Last : out Ada.Streams.Stream_Element_Offset); -- Add a new storage reference in the header and return its position in the header. -- Raises the No_Header_Slot if there is no room in the header. procedure Add_Storage (Header : in out Wallet_Header; Identifier : in Storage_Identifier; Max_Block : in Positive; Pos : out Block_Index); end Keystore.IO.Headers;
sungyeon/drake
Ada
157
adb
with C.crt_externs; function System.Environment_Block return C.char_ptr_ptr is begin return C.crt_externs.NSGetEnviron.all; end System.Environment_Block;
reznikmm/matreshka
Ada
5,481
ads
------------------------------------------------------------------------------ -- -- -- 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. ------------------------------------------------------------------------------ -- An expansion node is an object node used to indicate a flow across the -- boundary of an expansion region. A flow into a region contains a -- collection that is broken into its individual elements inside the region, -- which is executed once per element. A flow out of a region combines -- individual elements into a collection for use outside the region. ------------------------------------------------------------------------------ limited with AMF.UML.Expansion_Regions; with AMF.UML.Object_Nodes; package AMF.UML.Expansion_Nodes is pragma Preelaborate; type UML_Expansion_Node is limited interface and AMF.UML.Object_Nodes.UML_Object_Node; type UML_Expansion_Node_Access is access all UML_Expansion_Node'Class; for UML_Expansion_Node_Access'Storage_Size use 0; not overriding function Get_Region_As_Input (Self : not null access constant UML_Expansion_Node) return AMF.UML.Expansion_Regions.UML_Expansion_Region_Access is abstract; -- Getter of ExpansionNode::regionAsInput. -- -- The expansion region for which the node is an input. not overriding procedure Set_Region_As_Input (Self : not null access UML_Expansion_Node; To : AMF.UML.Expansion_Regions.UML_Expansion_Region_Access) is abstract; -- Setter of ExpansionNode::regionAsInput. -- -- The expansion region for which the node is an input. not overriding function Get_Region_As_Output (Self : not null access constant UML_Expansion_Node) return AMF.UML.Expansion_Regions.UML_Expansion_Region_Access is abstract; -- Getter of ExpansionNode::regionAsOutput. -- -- The expansion region for which the node is an output. not overriding procedure Set_Region_As_Output (Self : not null access UML_Expansion_Node; To : AMF.UML.Expansion_Regions.UML_Expansion_Region_Access) is abstract; -- Setter of ExpansionNode::regionAsOutput. -- -- The expansion region for which the node is an output. end AMF.UML.Expansion_Nodes;
reznikmm/matreshka
Ada
6,920
adb
------------------------------------------------------------------------------ -- -- -- Matreshka Project -- -- -- -- Open Document Toolkit -- -- -- -- Runtime Library Component -- -- -- ------------------------------------------------------------------------------ -- -- -- Copyright © 2014, Vadim Godunko <[email protected]> -- -- All rights reserved. -- -- -- -- Redistribution and use in source and binary forms, with or without -- -- modification, are permitted provided that the following conditions -- -- are met: -- -- -- -- * Redistributions of source code must retain the above copyright -- -- notice, this list of conditions and the following disclaimer. -- -- -- -- * Redistributions in binary form must reproduce the above copyright -- -- notice, this list of conditions and the following disclaimer in the -- -- documentation and/or other materials provided with the distribution. -- -- -- -- * Neither the name of the Vadim Godunko, IE nor the names of its -- -- contributors may be used to endorse or promote products derived from -- -- this software without specific prior written permission. -- -- -- -- THIS SOFTWARE IS PROVIDED BY THE COPYRIGHT HOLDERS AND CONTRIBUTORS -- -- "AS IS" AND ANY EXPRESS OR IMPLIED WARRANTIES, INCLUDING, BUT NOT -- -- LIMITED TO, THE IMPLIED WARRANTIES OF MERCHANTABILITY AND FITNESS FOR -- -- A PARTICULAR PURPOSE ARE DISCLAIMED. IN NO EVENT SHALL THE COPYRIGHT -- -- HOLDER OR CONTRIBUTORS BE LIABLE FOR ANY DIRECT, INDIRECT, INCIDENTAL, -- -- SPECIAL, EXEMPLARY, OR CONSEQUENTIAL DAMAGES (INCLUDING, BUT NOT LIMITED -- -- TO, PROCUREMENT OF SUBSTITUTE GOODS OR SERVICES; LOSS OF USE, DATA, OR -- -- PROFITS; OR BUSINESS INTERRUPTION) HOWEVER CAUSED AND ON ANY THEORY OF -- -- LIABILITY, WHETHER IN CONTRACT, STRICT LIABILITY, OR TORT (INCLUDING -- -- NEGLIGENCE OR OTHERWISE) ARISING IN ANY WAY OUT OF THE USE OF THIS -- -- SOFTWARE, EVEN IF ADVISED OF THE POSSIBILITY OF SUCH DAMAGE. -- -- -- ------------------------------------------------------------------------------ -- $Revision$ $Date$ ------------------------------------------------------------------------------ with Matreshka.DOM_Documents; with Matreshka.ODF_String_Constants; with ODF.DOM.Iterators; with ODF.DOM.Visitors; package body Matreshka.ODF_Text.Reference_Ref_Elements is ------------ -- Create -- ------------ overriding function Create (Parameters : not null access Matreshka.DOM_Elements.Element_L2_Parameters) return Text_Reference_Ref_Element_Node is begin return Self : Text_Reference_Ref_Element_Node do Matreshka.ODF_Text.Constructors.Initialize (Self'Unchecked_Access, Parameters.Document, Matreshka.ODF_String_Constants.Text_Prefix); end return; end Create; ---------------- -- Enter_Node -- ---------------- overriding procedure Enter_Node (Self : not null access Text_Reference_Ref_Element_Node; Visitor : in out XML.DOM.Visitors.Abstract_Visitor'Class; Control : in out XML.DOM.Visitors.Traverse_Control) is begin if Visitor in ODF.DOM.Visitors.Abstract_ODF_Visitor'Class then ODF.DOM.Visitors.Abstract_ODF_Visitor'Class (Visitor).Enter_Text_Reference_Ref (ODF.DOM.Text_Reference_Ref_Elements.ODF_Text_Reference_Ref_Access (Self), Control); else Matreshka.DOM_Elements.Abstract_Element_Node (Self.all).Enter_Node (Visitor, Control); end if; end Enter_Node; -------------------- -- Get_Local_Name -- -------------------- overriding function Get_Local_Name (Self : not null access constant Text_Reference_Ref_Element_Node) return League.Strings.Universal_String is pragma Unreferenced (Self); begin return Matreshka.ODF_String_Constants.Reference_Ref_Element; end Get_Local_Name; ---------------- -- Leave_Node -- ---------------- overriding procedure Leave_Node (Self : not null access Text_Reference_Ref_Element_Node; Visitor : in out XML.DOM.Visitors.Abstract_Visitor'Class; Control : in out XML.DOM.Visitors.Traverse_Control) is begin if Visitor in ODF.DOM.Visitors.Abstract_ODF_Visitor'Class then ODF.DOM.Visitors.Abstract_ODF_Visitor'Class (Visitor).Leave_Text_Reference_Ref (ODF.DOM.Text_Reference_Ref_Elements.ODF_Text_Reference_Ref_Access (Self), Control); else Matreshka.DOM_Elements.Abstract_Element_Node (Self.all).Leave_Node (Visitor, Control); end if; end Leave_Node; ---------------- -- Visit_Node -- ---------------- overriding procedure Visit_Node (Self : not null access Text_Reference_Ref_Element_Node; Iterator : in out XML.DOM.Visitors.Abstract_Iterator'Class; Visitor : in out XML.DOM.Visitors.Abstract_Visitor'Class; Control : in out XML.DOM.Visitors.Traverse_Control) is begin if Iterator in ODF.DOM.Iterators.Abstract_ODF_Iterator'Class then ODF.DOM.Iterators.Abstract_ODF_Iterator'Class (Iterator).Visit_Text_Reference_Ref (Visitor, ODF.DOM.Text_Reference_Ref_Elements.ODF_Text_Reference_Ref_Access (Self), Control); else Matreshka.DOM_Elements.Abstract_Element_Node (Self.all).Visit_Node (Iterator, Visitor, Control); end if; end Visit_Node; begin Matreshka.DOM_Documents.Register_Element (Matreshka.ODF_String_Constants.Text_URI, Matreshka.ODF_String_Constants.Reference_Ref_Element, Text_Reference_Ref_Element_Node'Tag); end Matreshka.ODF_Text.Reference_Ref_Elements;
reznikmm/matreshka
Ada
4,005
ads
------------------------------------------------------------------------------ -- -- -- Matreshka Project -- -- -- -- Open Document Toolkit -- -- -- -- Runtime Library Component -- -- -- ------------------------------------------------------------------------------ -- -- -- Copyright © 2014, Vadim Godunko <[email protected]> -- -- All rights reserved. -- -- -- -- Redistribution and use in source and binary forms, with or without -- -- modification, are permitted provided that the following conditions -- -- are met: -- -- -- -- * Redistributions of source code must retain the above copyright -- -- notice, this list of conditions and the following disclaimer. -- -- -- -- * Redistributions in binary form must reproduce the above copyright -- -- notice, this list of conditions and the following disclaimer in the -- -- documentation and/or other materials provided with the distribution. -- -- -- -- * Neither the name of the Vadim Godunko, IE nor the names of its -- -- contributors may be used to endorse or promote products derived from -- -- this software without specific prior written permission. -- -- -- -- THIS SOFTWARE IS PROVIDED BY THE COPYRIGHT HOLDERS AND CONTRIBUTORS -- -- "AS IS" AND ANY EXPRESS OR IMPLIED WARRANTIES, INCLUDING, BUT NOT -- -- LIMITED TO, THE IMPLIED WARRANTIES OF MERCHANTABILITY AND FITNESS FOR -- -- A PARTICULAR PURPOSE ARE DISCLAIMED. IN NO EVENT SHALL THE COPYRIGHT -- -- HOLDER OR CONTRIBUTORS BE LIABLE FOR ANY DIRECT, INDIRECT, INCIDENTAL, -- -- SPECIAL, EXEMPLARY, OR CONSEQUENTIAL DAMAGES (INCLUDING, BUT NOT LIMITED -- -- TO, PROCUREMENT OF SUBSTITUTE GOODS OR SERVICES; LOSS OF USE, DATA, OR -- -- PROFITS; OR BUSINESS INTERRUPTION) HOWEVER CAUSED AND ON ANY THEORY OF -- -- LIABILITY, WHETHER IN CONTRACT, STRICT LIABILITY, OR TORT (INCLUDING -- -- NEGLIGENCE OR OTHERWISE) ARISING IN ANY WAY OUT OF THE USE OF THIS -- -- SOFTWARE, EVEN IF ADVISED OF THE POSSIBILITY OF SUCH DAMAGE. -- -- -- ------------------------------------------------------------------------------ -- $Revision$ $Date$ ------------------------------------------------------------------------------ with ODF.DOM.Number_Position_Attributes; package Matreshka.ODF_Number.Position_Attributes is type Number_Position_Attribute_Node is new Matreshka.ODF_Number.Abstract_Number_Attribute_Node and ODF.DOM.Number_Position_Attributes.ODF_Number_Position_Attribute with null record; overriding function Create (Parameters : not null access Matreshka.DOM_Attributes.Attribute_L2_Parameters) return Number_Position_Attribute_Node; overriding function Get_Local_Name (Self : not null access constant Number_Position_Attribute_Node) return League.Strings.Universal_String; end Matreshka.ODF_Number.Position_Attributes;
stcarrez/ada-asf
Ada
11,274
ads
----------------------------------------------------------------------- -- components-core-views -- ASF View Components -- Copyright (C) 2009, 2010, 2011, 2012, 2017, 2021, 2022 Stephane Carrez -- Written by Stephane Carrez ([email protected]) -- -- Licensed under the Apache License, Version 2.0 (the "License"); -- you may not use this file except in compliance with the License. -- You may obtain a copy of the License at -- -- http://www.apache.org/licenses/LICENSE-2.0 -- -- Unless required by applicable law or agreed to in writing, software -- distributed under the License is distributed on an "AS IS" BASIS, -- WITHOUT WARRANTIES OR CONDITIONS OF ANY KIND, either express or implied. -- See the License for the specific language governing permissions and -- limitations under the License. ----------------------------------------------------------------------- with Util.Beans.Objects; with Util.Locales; with ASF.Events.Faces; with ASF.Lifecycles; with ASF.Components.Html.Forms; with ASF.Views.Nodes; private with Ada.Containers.Vectors; package ASF.Components.Core.Views is -- Name of the facet that holds the metadata information -- (we use the same name as JSF 2 specification). METADATA_FACET_NAME : constant String := "javax_faces_metadata"; type UIViewMetaData is tagged; type UIViewMetaData_Access is access all UIViewMetaData'Class; -- ------------------------------ -- View component -- ------------------------------ type UIView is new Core.UIComponentBase with private; type UIView_Access is access all UIView'Class; -- Get the content type returned by the view. function Get_Content_Type (UI : in UIView; Context : in Faces_Context'Class) return String; -- Set the content type returned by the view. procedure Set_Content_Type (UI : in out UIView; Value : in String); -- Get the locale to be used when rendering messages in the view. -- If a locale was set explicitly, return it. -- If the view component defines a <b>locale</b> attribute, evaluate and return its value. -- If the locale is empty, calculate the locale by using the request context and the view -- handler. function Get_Locale (UI : in UIView; Context : in Faces_Context'Class) return Util.Locales.Locale; -- Set the locale to be used when rendering messages in the view. procedure Set_Locale (UI : in out UIView; Locale : in Util.Locales.Locale); -- Encode the beginning of the view. Set the response content type. overriding procedure Encode_Begin (UI : in UIView; Context : in out Faces_Context'Class); -- Encode the end of the view. overriding procedure Encode_End (UI : in UIView; Context : in out Faces_Context'Class); -- Decode any new state of the specified component from the request contained -- in the specified context and store that state on the component. -- -- During decoding, events may be enqueued for later processing -- (by event listeners that have registered an interest), by calling -- the <b>Queue_Event</b> on the associated component. overriding procedure Process_Decodes (UI : in out UIView; Context : in out Faces_Context'Class); -- Perform the component tree processing required by the <b>Process Validations</b> -- phase of the request processing lifecycle for all facets of this component, -- all children of this component, and this component itself, as follows: -- <ul> -- <li>If this component <b>rendered</b> property is false, skip further processing. -- <li>Call the <b>Process_Validators</b> of all facets and children. -- <ul> overriding procedure Process_Validators (UI : in out UIView; Context : in out Faces_Context'Class); -- Perform the component tree processing required by the <b>Update Model Values</b> -- phase of the request processing lifecycle for all facets of this component, -- all children of this component, and this component itself, as follows. -- <ul> -- <li>If this component <b>rendered</b> property is false, skip further processing. -- <li>Call the <b>Process_Updates/b> of all facets and children. -- <ul> overriding procedure Process_Updates (UI : in out UIView; Context : in out Faces_Context'Class); -- Broadcast any events that have been queued for the <b>Invoke Application</b> -- phase of the request processing lifecycle and to clear out any events -- for later phases if the event processing for this phase caused -- <b>renderResponse</b> or <b>responseComplete</b> to be called. procedure Process_Application (UI : in out UIView; Context : in out Faces_Context'Class); -- Queue an event for broadcast at the end of the current request -- processing lifecycle phase. The event object -- will be freed after being dispatched. overriding procedure Queue_Event (UI : in out UIView; Event : not null access ASF.Events.Faces.Faces_Event'Class); -- Broadcast the events after the specified lifecycle phase. -- Events that were queued will be freed. procedure Broadcast (UI : in out UIView; Phase : in ASF.Lifecycles.Phase_Type; Context : in out Faces_Context'Class); -- Clear the events that were queued. procedure Clear_Events (UI : in out UIView); -- Set the component tree that must be rendered before this view. -- This is an internal method used by Steal_Root_Component exclusively. procedure Set_Before_View (UI : in out UIView'Class; Tree : in Base.UIComponent_Access); -- Set the component tree that must be rendered after this view. -- This is an internal method used by Steal_Root_Component exclusively. procedure Set_After_View (UI : in out UIView'Class; Tree : in Base.UIComponent_Access); -- Set the metadata facet on the UIView component. procedure Set_Metadata (UI : in out UIView; Meta : in UIViewMetaData_Access; Tag : access ASF.Views.Nodes.Tag_Node'Class); -- Finalize the object. overriding procedure Finalize (UI : in out UIView); -- ------------------------------ -- View Parameter Component -- ------------------------------ -- The <b>UIViewParameter</b> component represents a request parameter that must be mapped -- to a backed bean object. This component does not participate in the rendering. type UIViewParameter is new Html.Forms.UIInput with private; type UIViewParameter_Access is access all UIViewParameter'Class; -- Get the input parameter from the submitted context. This operation is called by -- <tt>Process_Decodes</tt> to retrieve the request parameter associated with the component. overriding function Get_Parameter (UI : in UIViewParameter; Context : in Faces_Context'Class) return String; -- ------------------------------ -- View Action Component -- ------------------------------ -- The <b>UIViewAction</b> component implements the view action tag defined by Jave Server -- Faces 2.2. This action defined by that tag will be called type UIViewAction is new Html.Forms.UICommand with private; type UIViewAction_Access is access all UIViewAction'Class; -- Decode the request and prepare for the execution for the view action. overriding procedure Process_Decodes (UI : in out UIViewAction; Context : in out Faces_Context'Class); -- ------------------------------ -- View Metadata Component -- ------------------------------ -- The <b>UIViewMetaData</b> component defines the view meta data components. -- These components defines how to handle some request parameters for a GET request -- as well as some actions that must be made upon reception of a request. -- -- From ASF lifecycle management, if the request is a GET, this component is used -- as the root of the component tree. The APPLY_REQUESTS .. INVOKE_APPLICATION actions -- are called on that component tree. It is also used for the RENDER_RESPONSE, and -- we have to propagate the rendering on the real view root. Therefore, the Encode_XXX -- operations are overridden to propagate on the real root. type UIViewMetaData is new UIView with private; -- Start encoding the UIComponent. overriding procedure Encode_Begin (UI : in UIViewMetaData; Context : in out Faces_Context'Class); -- Encode the children of this component. overriding procedure Encode_Children (UI : in UIViewMetaData; Context : in out Faces_Context'Class); -- Finish encoding the component. overriding procedure Encode_End (UI : in UIViewMetaData; Context : in out Faces_Context'Class); -- Queue an event for broadcast at the end of the current request -- processing lifecycle phase. The event object -- will be freed after being dispatched. overriding procedure Queue_Event (UI : in out UIViewMetaData; Event : not null access ASF.Events.Faces.Faces_Event'Class); -- Broadcast the events after the specified lifecycle phase. -- Events that were queued will be freed. overriding procedure Broadcast (UI : in out UIViewMetaData; Phase : in ASF.Lifecycles.Phase_Type; Context : in out Faces_Context'Class); -- Clear the events that were queued. overriding procedure Clear_Events (UI : in out UIViewMetaData); -- Get the root component. function Get_Root (UI : in UIViewMetaData) return Base.UIComponent_Access; private use ASF.Lifecycles; type Faces_Event_Access is access all ASF.Events.Faces.Faces_Event'Class; package Event_Vectors is new Ada.Containers.Vectors (Index_Type => Natural, Element_Type => Faces_Event_Access); type Event_Queues is array (Phase_Type) of Event_Vectors.Vector; type UIView is new Core.UIComponentBase with record Content_Type : Util.Beans.Objects.Object; Phase_Events : Event_Queues; Meta : UIViewMetaData_Access := null; Locale : Util.Locales.Locale := Util.Locales.NULL_LOCALE; Left_Tree : Base.UIComponent_Access := null; Right_Tree : Base.UIComponent_Access := null; end record; type UIViewParameter is new Html.Forms.UIInput with record Name : Ada.Strings.Unbounded.Unbounded_String; end record; type UIViewAction is new Html.Forms.UICommand with null record; type UIViewMetaData is new UIView with record Root : UIView_Access := null; end record; end ASF.Components.Core.Views;
reznikmm/matreshka
Ada
3,850
ads
------------------------------------------------------------------------------ -- -- -- Matreshka Project -- -- -- -- Open Document Toolkit -- -- -- -- Runtime Library Component -- -- -- ------------------------------------------------------------------------------ -- -- -- Copyright © 2013, 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 Matreshka.ODF_Attributes.Office.Value_Type; package ODF.DOM.Attributes.Office.Value_Type.Internals is function Create (Node : Matreshka.ODF_Attributes.Office.Value_Type.Office_Value_Type_Access) return ODF.DOM.Attributes.Office.Value_Type.ODF_Office_Value_Type; function Wrap (Node : Matreshka.ODF_Attributes.Office.Value_Type.Office_Value_Type_Access) return ODF.DOM.Attributes.Office.Value_Type.ODF_Office_Value_Type; end ODF.DOM.Attributes.Office.Value_Type.Internals;
faelys/natools
Ada
1,662
ads
------------------------------------------------------------------------------ -- Copyright (c) 2011, Natacha Porté -- -- -- -- Permission to use, copy, modify, and distribute this software for any -- -- purpose with or without fee is hereby granted, provided that the above -- -- copyright notice and this permission notice appear in all copies. -- -- -- -- THE SOFTWARE IS PROVIDED "AS IS" AND THE AUTHOR DISCLAIMS ALL WARRANTIES -- -- WITH REGARD TO THIS SOFTWARE INCLUDING ALL IMPLIED WARRANTIES OF -- -- MERCHANTABILITY AND FITNESS. IN NO EVENT SHALL THE AUTHOR BE LIABLE FOR -- -- ANY SPECIAL, DIRECT, INDIRECT, OR CONSEQUENTIAL DAMAGES OR ANY DAMAGES -- -- WHATSOEVER RESULTING FROM LOSS OF USE, DATA OR PROFITS, WHETHER IN AN -- -- ACTION OF CONTRACT, NEGLIGENCE OR OTHER TORTIOUS ACTION, ARISING OUT OF -- -- OR IN CONNECTION WITH THE USE OR PERFORMANCE OF THIS SOFTWARE. -- ------------------------------------------------------------------------------ ------------------------------------------------------------------------------ -- Natools.Chunked_Strings.Tests.CXA4032 is the transcription to -- -- Chunked_String of ACATS test CXA4032 for Unbounded_String. -- ------------------------------------------------------------------------------ with Natools.Tests; generic procedure Natools.Chunked_Strings.Tests.CXA4032 (Report : in out Natools.Tests.Reporter'Class); pragma Preelaborate (CXA4032);
zhmu/ananas
Ada
53,949
ads
------------------------------------------------------------------------------ -- -- -- GNAT COMPILER COMPONENTS -- -- -- -- E R R O U T -- -- -- -- S p e c -- -- -- -- Copyright (C) 1992-2022, 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. -- -- -- ------------------------------------------------------------------------------ -- This package contains the routines to output error messages. They are -- basically system independent, however in some environments, e.g. when the -- parser is embedded into an editor, it may be appropriate to replace the -- implementation of this package. with Err_Vars; with Erroutc; with Namet; use Namet; with Table; with Types; use Types; with Uintp; use Uintp; with System; package Errout is Current_Error_Source_File : Source_File_Index renames Err_Vars.Current_Error_Source_File; -- Id of current messages. Used to post file name when unit changes. This -- is initialized to Main_Source_File at the start of a compilation, which -- means that no file names will be output unless there are errors in -- units other than the main unit. However, if the main unit has a pragma -- Source_Reference line, then this is initialized to No_Source_File, to -- force an initial reference to the real source file name. Raise_Exception_On_Error : Nat renames Err_Vars.Raise_Exception_On_Error; -- If this value is non-zero, then any attempt to generate an error -- message raises the exception Error_Msg_Exception, and the error message -- is not output. This is used for defending against junk resulting from -- illegalities, and also for substitution of more appropriate error -- messages from higher semantic levels. It is a counter so that the -- increment/decrement protocol nests neatly. Error_Msg_Exception : exception renames Err_Vars.Error_Msg_Exception; -- Exception raised if Raise_Exception_On_Error is true Warning_Doc_Switch : Boolean renames Err_Vars.Warning_Doc_Switch; -- If this is set True, then the ??/?*?/?$?/?x?/?.x?/?_x? insertion -- sequences in error messages generate appropriate tags for the output -- error messages. If this switch is False, then these sequences are still -- recognized (for the purposes of implementing the pattern matching in -- pragmas Warnings (Off,..) and Warning_As_Pragma(...) but do not result -- in adding the error message tag. The -gnatw.d switch sets this flag -- True, -gnatw.D sets this flag False. Current_Node : Node_Id := Empty; -- Used by Error_Msg as a default Node_Id. -- Relevant only when Opt.Include_Subprogram_In_Messages is set. ----------------------------------- -- Suppression of Error Messages -- ----------------------------------- -- In an effort to reduce the impact of redundant error messages, the -- error output routines in this package normally suppress certain -- classes of messages as follows: -- 1. Identical messages placed at the same point in the text. Such -- duplicate error message result for example from rescanning -- sections of the text that contain lexical errors. Only one of -- such a set of duplicate messages is output, and the rest are -- suppressed. -- 2. If more than one parser message is generated for a single source -- line, then only the first message is output, the remaining -- messages on the same line are suppressed. -- 3. If a message is posted on a node for which a message has been -- previously posted, then only the first message is retained. The -- Error_Posted flag is used to detect such multiple postings. Note -- that this only applies to semantic messages, since otherwise -- for parser messages, this would be a special case of case 2. -- 4. If a message is posted on a node whose Etype or Entity -- fields reference entities on which an error message has -- already been placed, as indicated by the Error_Posted flag -- being set on these entities, then the message is suppressed. -- 5. If a message attempts to insert an Error node, or a direct -- reference to the Any_Type node, then the message is suppressed. -- 6. Note that cases 2-5 only apply to error messages, not warning -- messages. Warning messages are only suppressed for case 1, and -- when they come from other than the main extended unit. -- 7. If an error or warning references an internal name, and we have -- already placed an error (not warning) message at that location, -- then we assume this is cascaded junk and delete the message. -- This normal suppression action may be overridden in cases 2-5 (but -- not in case 1 or 7) by setting All_Errors mode, or by setting the -- unconditional message insertion character (!) as described below. --------------------------------------------------------- -- Error Message Text and Message Insertion Characters -- --------------------------------------------------------- -- Error message text strings are composed of lower case letters, digits -- and the special characters space, comma, period, colon and semicolon, -- apostrophe and parentheses. Special insertion characters can also -- appear which cause the error message circuit to modify the given -- string as follows: -- Insertion character % (Percent: insert name from Names table) -- The character % is replaced by the text for the name specified by -- the Name_Id value stored in Error_Msg_Name_1. A blank precedes the -- name if it is preceded by a non-blank character other than left -- parenthesis. The name is enclosed in quotes unless manual quotation -- mode is set. If the Name_Id is set to No_Name, then no insertion -- occurs; if the Name_Id is set to Error_Name, then the string -- <error> is inserted. A second and third % may appear in a single -- message, similarly replaced by the names which are specified by the -- Name_Id values stored in Error_Msg_Name_2 and Error_Msg_Name_3. The -- names are decoded and cased according to the current identifier -- casing mode. Note: if a unit name ending with %b or %s is passed -- for this kind of insertion, this suffix is simply stripped. Use a -- unit name insertion ($) to process the suffix. -- -- Note: the special names _xxx (xxx = Pre/Post/Invariant) are changed -- to insert the string xxx'Class into the message. -- Insertion character %% (Double percent: insert literal name) -- The character sequence %% acts as described above for %, except -- that the name is simply obtained with Get_Name_String and is not -- decoded or cased, it is inserted literally from the names table. -- A trailing %b or %s is not treated specially. -- -- Note: the special names _xxx (xxx = Pre/Post/Invariant) are changed -- to insert the string xxx'Class into the message. -- Insertion character $ (Dollar: insert unit name from Names table) -- The character $ is treated similarly to %, except that the name is -- obtained from the Unit_Name_Type value in Error_Msg_Unit_1 and -- Error_Msg_Unit_2, as provided by Get_Unit_Name_String in package -- Uname. Note that this name includes the postfix (spec) or (body) -- strings. If this postfix is not required, use the normal % insertion -- for the unit name. -- Insertion character { (Left brace: insert file name from names table) -- The character { is treated similarly to %, except that the input -- value is a File_Name_Type value stored in Error_Msg_File_1 or -- Error_Msg_File_2 or Error_Msg_File_3. The value is output literally, -- enclosed in quotes as for %, but the case is not modified, the -- insertion is the exact string stored in the names table without -- adjusting the casing. -- Insertion character * (Asterisk: insert reserved word name) -- The insertion character * is treated exactly like % except that the -- resulting name is cased according to the default conventions for -- reserved words (see package Scans). -- Insertion character & (Ampersand: insert name from node) -- The insertion character & is treated similarly to %, except that -- the name is taken from the Chars field of the given node, and may -- refer to a child unit name, or a selected component. The casing is, -- if possible, taken from the original source reference, which is -- obtained from the Sloc field of the given node or nodes. If no Sloc -- is available (happens e.g. for nodes in package Standard), then the -- default case (see Scans spec) is used. The nodes to be used are -- stored in Error_Msg_Node_1, Error_Msg_Node_2. No insertion occurs -- for the Empty node, and the Error node results in the insertion of -- the characters <error>. In addition, if the special global variable -- Error_Msg_Qual_Level is non-zero, then the reference will include -- up to the given number of levels of qualification, using the scope -- chain. -- -- Note: the special names _xxx (xxx = Pre/Post/Invariant) are changed -- to insert the string xxx'Class into the message. -- Insertion character # (Pound: insert line number reference) -- The character # is replaced by the string indicating the source -- position stored in Error_Msg_Sloc. There are three cases: -- -- for package Standard: in package Standard -- for locations in current file: at line nnn:ccc -- for locations in other files: at filename:nnn:ccc -- -- By convention, the # insertion character is only used at the end of -- an error message, so the above strings only appear as the last -- characters of an error message. The only exceptions to this rule -- are that an RM reference may follow in the form (RM .....) and a -- right parenthesis may immediately follow the #. In the case of -- continued messages, # can only appear at the end of a group of -- continuation messages, except that \\ messages which always start -- a new line end the sequence from the point of view of this rule. -- The idea is that for any use of -gnatj, it will still be the case -- that a location reference appears only at the end of a line. -- Note: the output of the string "at " is suppressed if the string -- " from" or " from " immediately precedes the insertion character #. -- Certain messages read better with from than at. -- Insertion character } (Right brace: insert type reference) -- The character } is replaced by a string describing the type -- referenced by the entity whose Id is stored in Error_Msg_Node_1. -- The string gives the name or description of the type, and also -- where appropriate the location of its declaration. Special cases -- like "some integer type" are handled appropriately. Only one } is -- allowed in a message, since there is not enough room for two (the -- insertion can be quite long, including a file name). In addition, if -- the special global variable Error_Msg_Qual_Level is non-zero, then -- the reference will include up to the given number of levels of -- qualification, using the scope chain. -- Insertion character @ (At: insert column number reference) -- The character @ is replaced by null if the RM_Column_Check mode is -- off (False). If the switch is on (True), then @ is replaced by the -- text string " in column nnn" where nnn is the decimal -- representation of the column number stored in Error_Msg_Col plus -- one (the plus one is because the number is stored 0-origin and -- displayed 1-origin). -- Insertion character ^ (Caret: insert integer value) -- The character ^ is replaced by the decimal conversion of the Uint -- value stored in Error_Msg_Uint_1, with a possible leading minus. -- A second ^ may occur in the message, in which case it is replaced -- by the decimal conversion of the Uint value in Error_Msg_Uint_2. -- Insertion character > (Greater Than: run time name) -- The character > is replaced by a string of the form (name) if -- Targparm scanned out a Run_Time_Name (see package Targparm for -- details). The name is enclosed in parentheses and output in mixed -- case mode (upper case after any space in the name). If no run time -- name is defined, this insertion character has no effect. -- Insertion character ! (Exclamation: unconditional message) -- The character ! appearing anywhere in the text of a message makes -- the message unconditional which means that it is output even if it -- would normally be suppressed. See section above for a description -- of the cases in which messages are normally suppressed. Note that -- in the case of warnings, the meaning is that the warning should not -- be removed in dead code (that's the only time that the use of ! -- has any effect for a warning). -- -- Note: the presence of ! is ignored in continuation messages (i.e. -- messages starting with the \ insertion character). The effect of the -- use of ! in a parent message automatically applies to all of its -- continuation messages (since we clearly don't want any case in which -- continuations are separated from the main message). It is allowable -- to put ! in continuation messages, and the usual style is to include -- it, since it makes it clear that the continuation is part of an -- unconditional message. -- Insertion character !! (Double exclamation: unconditional warning) -- Normally warning messages issued in other than the main unit are -- suppressed. If the message contains !! then this suppression is -- avoided. This is currently used by the Compile_Time_Warning pragma -- to ensure the message for a with'ed unit is output, and for warnings -- on ineffective back-end inlining, which is detected in units that -- contain subprograms to be inlined in the main program. -- Insertion character ? (Question: warning message -- OBSOLETE) -- The character ? appearing anywhere in a message makes the message -- warning instead of a normal error message, and the text of the -- message will be preceded by "warning:" in the normal case. The -- handling of warnings is further controlled by the Warning_Mode -- option (-w switch), see package Opt for further details, and also by -- the current setting from pragma Warnings. This pragma applies only -- to warnings issued from the semantic phase (not the parser), but -- currently all relevant warnings are posted by the semantic phase -- anyway. Messages starting with (style) are also treated as warning -- messages. -- -- Note: when a warning message is output, the text of the message is -- preceded by "warning: " in the normal case. An exception to this -- rule occurs when the text of the message starts with "info: " in -- which case this string is not prepended. This allows callers to -- label certain warnings as informational messages, rather than as -- warning messages requiring some action. -- -- Note: the presence of ? is ignored in continuation messages (i.e. -- messages starting with the \ insertion character). The warning -- status of continuations is determined only by the parent message -- which is being continued. It is allowable to put ? in continuation -- messages, and the usual style is to include it, since it makes it -- clear that the continuation is part of a warning message, but it is -- not necessary to go through any computational effort to include it. -- -- Note: this usage is obsolete; use ?? ?*? ?$? ?x? ?.x? ?_x? to -- specify the string to be added when Warn_Doc_Switch is set to True. -- If this switch is True, then for simple ? messages it has no effect. -- This simple form is to ease transition and may be removed later -- except for GNATprove-specific messages (info and warnings) which are -- not subject to the same GNAT warning switches. -- Insertion character ?? (Two question marks: default warning) -- Like ?, but if the flag Warn_Doc_Switch is True, adds the string -- "[enabled by default]" at the end of the warning message. For -- continuations, use this in each continuation message. -- Insertion character ?x? ?.x? ?_x? (warning with switch) -- Like ?, but if the flag Warn_Doc_Switch is True, adds the string -- "[-gnatwx]", "[-gnatw.x]", or "[-gnatw_x]", at the end of the -- warning message. x must be lower case. For continuations, use this -- on each continuation message. -- Insertion character ?*? (restriction warning) -- Like ?, but if the flag Warn_Doc_Switch is True, adds the string -- "[restriction warning]" at the end of the warning message. For -- continuations, use this on each continuation message. -- Insertion character ?$? (elaboration informational messages) -- Like ?, but if the flag Warn_Doc_Switch is True, adds the string -- "[-gnatel]" at the end of the info message. This is used for the -- messages generated by the switch -gnatel. For continuations, use -- this on each continuation message. -- Insertion character < (Less Than: conditional warning message) -- The character < appearing anywhere in a message is used for a -- conditional error message. If Error_Msg_Warn is True, then the -- effect is the same as ? described above, and in particular << <x< -- <$< <*< have the effect of ?? ?x? ?$? ?*? respectively. If -- Error_Msg_Warn is False, then the < << or <X< sequence is ignored -- and the message is treated as a error rather than a warning. -- Insertion character A-Z (Upper case letter: Ada reserved word) -- If two or more upper case letters appear in the message, they are -- taken as an Ada reserved word, and are converted to the default -- case for reserved words (see Scans package spec). Surrounding -- quotes are added unless manual quotation mode is currently set. -- RM and SPARK are special exceptions, they are never treated as -- keywords, and just appear verbatim, with no surrounding quotes. -- As a special case, 'R'M is used instead of RM (which is not treated -- as a keyword) to indicate when the reference to the RM is possibly -- not useful anymore, and could possibly be replaced by a comment -- in the source. -- Insertion character ` (Backquote: set manual quotation mode) -- The backquote character always appears in pairs. Each backquote of -- the pair is replaced by a double quote character. In addition, any -- reserved keywords, or name insertions between these backquotes are -- not surrounded by the usual automatic double quotes. See the -- section below on manual quotation mode for further details. -- Insertion character ' (Quote: literal character) -- Precedes a character which is placed literally into the message. -- Used to insert characters into messages that are one of the -- insertion characters defined here. Also used for insertion of -- upper case letter sequences not to be treated as keywords. -- Insertion character \ (Backslash: continuation message) -- Indicates that the message is a continuation of a message -- previously posted. This is used to ensure that such groups of -- messages are treated as a unit. The \ character must be the first -- character of the message text. -- Insertion character \\ (Two backslashes: continuation with new line) -- This differs from \ only in -gnatjnn mode (Error_Message_Line_Length -- set non-zero). This sequence forces a new line to start even when -- continuations are being gathered into a single message. -- Insertion character | (Vertical bar: non-serious error) -- By default, error messages (but not warning messages) are considered -- to be fatal error messages, which prevent expansion and generation -- of code. If the insertion character | appears, the message is -- considered to be nonserious, and Serious_Errors_Detected is not -- incremented, so expansion is not prevented by such a msg. This -- insertion character is ignored in continuation messages. -- Insertion character ~ (Tilde: insert string) -- Indicates that Error_Msg_String (1 .. Error_Msg_Strlen) is to be -- inserted to replace the ~ character. The string is inserted in the -- literal form it appears, without any action on special characters. -- Insertion character [ (Left bracket: will/would be raised at run time) -- This is used in messages about exceptions being raised at run-time. -- If the current message is a warning message, then if the code is -- executed, the exception will be raised, and [ inserts: -- -- will be raised at run time -- -- If the current message is an error message, then it is an error -- because the exception would have been raised and [ inserts: -- -- would have been raised at run time -- -- Typically the message contains a < insertion which means that the -- message is a warning or error depending on Error_Msg_Warn. This is -- most typically used in the context of messages which are normally -- warnings, but are errors in GNATprove mode, corresponding to the -- permission in the definition of SPARK that allows an implementation -- to reject a program as illegal if a situation arises in which the -- compiler can determine that it is certain that a run-time check -- would have fail if the statement was executed. -- Insertion character ] (Right bracket: may/might be raised at run time) -- This is like [ except that the insertion messages say may/might, -- instead of will/would. -- Insertion sequence "(style)" (style message) -- This appears only at the start of the message (and not any of its -- continuations, if any), and indicates that the message is a style -- message. Style messages are also considered to be warnings, but -- they do not get a tag. -- Insertion sequence "info: " (informational message) -- This appears only at the start of the message (and not any of its -- continuations, if any), and indicates that the message is an info -- message. The message will be output with this prefix, and if there -- are continuations that are not printed using the -gnatj switch they -- will also have this prefix. Informational messages are usually also -- warnings, but they don't have to be. -- Insertion sequence "low: " or "medium: " or "high: " (check message) -- This appears only at the start of the message (and not any of its -- continuations, if any), and indicates that the message is a check -- message. The message will be output with this prefix. Check -- messages are not fatal (so are like info messages in that respect) -- and are not controlled by pragma Warnings. ----------------------------------------------------- -- Global Values Used for Error Message Insertions -- ----------------------------------------------------- -- The following global variables are essentially additional parameters -- passed to the error message routine for insertion sequences described -- above. The reason these are passed globally is that the insertion -- mechanism is essentially an untyped one in which the appropriate -- variables are set depending on the specific insertion characters used. -- Note that is mandatory that the caller ensure that global variables -- are set before the Error_Msg call, otherwise the result is undefined. -- Also note that calls to Error_Msg and its variants destroy the value of -- these global variables, as a way to support the inclusion of multiple -- insertion characters of the same type. For example, support for -- multiple characters % for a name in the message (up to 3) is -- implemented by unconditionally shifting the value for Error_Msg_Nam_2 -- to Error_Msg_Nam_1 and from Error_Msg_Nam_3 to Error_Msg_Nam_2 after -- dealing with insertion character %. The caller should ensure that all -- global variables are restored if needed prior to calling Error_Msg. Error_Msg_Col : Column_Number renames Err_Vars.Error_Msg_Col; -- Column for @ insertion character in message Error_Msg_Uint_1 : Uint renames Err_Vars.Error_Msg_Uint_1; Error_Msg_Uint_2 : Uint renames Err_Vars.Error_Msg_Uint_2; -- Uint values for ^ insertion characters in message Error_Msg_Sloc : Source_Ptr renames Err_Vars.Error_Msg_Sloc; -- Source location for # insertion character in message Error_Msg_Name_1 : Name_Id renames Err_Vars.Error_Msg_Name_1; Error_Msg_Name_2 : Name_Id renames Err_Vars.Error_Msg_Name_2; Error_Msg_Name_3 : Name_Id renames Err_Vars.Error_Msg_Name_3; -- Name_Id values for % insertion characters in message Error_Msg_File_1 : File_Name_Type renames Err_Vars.Error_Msg_File_1; Error_Msg_File_2 : File_Name_Type renames Err_Vars.Error_Msg_File_2; Error_Msg_File_3 : File_Name_Type renames Err_Vars.Error_Msg_File_3; -- File_Name_Type values for { insertion characters in message Error_Msg_Unit_1 : Unit_Name_Type renames Err_Vars.Error_Msg_Unit_1; Error_Msg_Unit_2 : Unit_Name_Type renames Err_Vars.Error_Msg_Unit_2; -- Unit_Name_Type values for $ insertion characters in message Error_Msg_Node_1 : Node_Id renames Err_Vars.Error_Msg_Node_1; Error_Msg_Node_2 : Node_Id renames Err_Vars.Error_Msg_Node_2; -- Node_Id values for & insertion characters in message Error_Msg_Qual_Level : Nat renames Err_Vars.Error_Msg_Qual_Level; -- Number of levels of qualification required for type name (see the -- description of the } insertion character). Note that this value does -- not get reset by any Error_Msg call, so the caller is responsible -- for resetting it. Error_Msg_Warn : Boolean renames Err_Vars.Error_Msg_Warn; -- Used if current message contains a < insertion character to indicate -- if the current message is a warning message. Must be set appropriately -- before any call to Error_Msg_xxx with a < insertion character present. -- Setting is irrelevant if no < insertion character is present. Error_Msg_String : String renames Err_Vars.Error_Msg_String; Error_Msg_Strlen : Natural renames Err_Vars.Error_Msg_Strlen; -- Used if current message contains a ~ insertion character to indicate -- insertion of the string Error_Msg_String (1 .. Error_Msg_Strlen). ----------------------------------------------------- -- Format of Messages and Manual Quotation Control -- ----------------------------------------------------- -- Messages are generally all in lower case, except for inserted names -- and appear in one of the following three forms: -- error: text -- warning: text -- The prefixes error and warning are supplied automatically (depending -- on the use of the ? insertion character), and the call to the error -- message routine supplies the text. The "error: " prefix is omitted -- if -gnatd_U is among the options given to gnat. -- Reserved Ada keywords in the message are in the default keyword case -- (determined from the given source program), surrounded by quotation -- marks. This is achieved by spelling the reserved word in upper case -- letters, which is recognized as a request for insertion of quotation -- marks by the error text processor. Thus for example: -- Error_Msg_AP ("IS expected"); -- would result in the output of one of the following: -- error: "is" expected -- error: "IS" expected -- error: "Is" expected -- the choice between these being made by looking at the casing convention -- used for keywords (actually the first compilation unit keyword) in the -- source file. -- Note: a special exception is that RM is never treated as a keyword -- but instead is copied literally into the message, this avoids the -- need for writing 'R'M for all reference manual quotes. A similar -- exception is applied to the occurrence of the string SPARK used in -- error messages about the SPARK subset of Ada. -- In the case of names, the default mode for the error text processor -- is to surround the name by quotation marks automatically. The case -- used for the identifier names is taken from the source program where -- possible, and otherwise is the default casing convention taken from -- the source file usage. -- In some cases, better control over the placement of quote marks is -- required. This is achieved using manual quotation mode. In this mode, -- one or more insertion sequences is surrounded by backquote characters. -- The backquote characters are output as double quote marks, and normal -- automatic insertion of quotes is suppressed between the double quotes. -- For example: -- Error_Msg_AP ("`END &;` expected"); -- generates a message like -- error: "end Open_Scope;" expected -- where the node specifying the name Open_Scope has been stored in -- Error_Msg_Node_1 prior to the call. The great majority of error -- messages operates in normal quotation mode. -- Note: the normal automatic insertion of spaces before insertion -- sequences (such as those that come from & and %) is suppressed in -- manual quotation mode, so blanks, if needed as in the above example, -- must be explicitly present. ---------------------------- -- Message ID Definitions -- ---------------------------- subtype Error_Msg_Id is Erroutc.Error_Msg_Id; function "=" (Left, Right : Error_Msg_Id) return Boolean renames Erroutc."="; -- A type used to represent specific error messages. Used by the clients -- of this package only in the context of the Get_Error_Id and -- Change_Error_Text subprograms. No_Error_Msg : constant Error_Msg_Id := Erroutc.No_Error_Msg; -- A constant which is different from any value returned by Get_Error_Id. -- Typically used by a client to indicate absense of a saved Id value. Warning_Msg : Error_Msg_Id := No_Error_Msg; -- This is set if a warning message is generated to the ID of the resulting -- message. Continuation messages have no effect. It is legitimate for the -- client to set this to No_Error_Msg and then test it to see if a warning -- message has been issued. procedure Delete_Warning_And_Continuations (Msg : Error_Msg_Id); -- Deletes the given warning message and all its continuations. This is -- typically used in conjunction with reading the value of Warning_Msg. function Get_Msg_Id return Error_Msg_Id renames Erroutc.Get_Msg_Id; -- Returns the Id of the message most recently posted using one of the -- Error_Msg routines. function Get_Location (E : Error_Msg_Id) return Source_Ptr renames Erroutc.Get_Location; -- Returns the flag location of the error message with the given id E ------------------------ -- List Pragmas Table -- ------------------------ -- When a pragma Page or pragma List is encountered by the parser, an -- entry is made in the following table. This table is then used to -- control the full listing if one is being generated. Note that the -- reason we do the processing in the parser is so that we get proper -- listing control even in syntax check only mode. type List_Pragma_Type is (List_On, List_Off, Page); type List_Pragma_Record is record Ptyp : List_Pragma_Type; Ploc : Source_Ptr; end record; -- Note: Ploc points to the terminating semicolon in the List_Off and Page -- cases, and to the pragma keyword for List_On. In the case of a pragma -- List_Off, a List_On entry is also made in the table, pointing to the -- pragma keyword. This ensures that, as required, a List (Off) pragma is -- listed even in list off mode. package List_Pragmas is new Table.Table ( Table_Component_Type => List_Pragma_Record, Table_Index_Type => Int, Table_Low_Bound => 1, Table_Initial => 50, Table_Increment => 200, Table_Name => "List_Pragmas"); --------------------------- -- Ignore_Errors Feature -- --------------------------- -- In certain cases, notably for optional subunits, the compiler operates -- in a mode where errors are to be ignored, and the whole unit is to be -- considered as not present. To implement this we provide the following -- flag to enable special handling, where error messages are suppressed, -- but the Fatal_Error flag will still be set in the normal manner. Ignore_Errors_Enable : Nat := 0; -- Triggering switch. If non-zero, then ignore errors mode is activated. -- This is a counter to allow convenient nesting of enable/disable. ----------------------- -- CODEFIX Facility -- ----------------------- -- The GNAT Studio and GNATBench IDE's have a codefix facility that allows -- for automatic correction of a subset of the errors and warnings issued -- by the compiler. This is done by recognizing the text of specific -- messages using appropriate matching patterns. -- The text of such messages should not be altered without coordinating -- with the codefix code. All such messages are marked by a specific -- style of comments, as shown by the following example: -- Error_Msg_N -- CODEFIX -- (parameters ....) -- Any message marked with this -- CODEFIX comment should not be modified -- without appropriate coordination. ------------------------------ -- Error Output Subprograms -- ------------------------------ procedure Initialize; -- Initializes for output of error messages. Must be called for each -- source file before using any of the other routines in the package. procedure Finalize (Last_Call : Boolean); -- Finalize processing of error message list. Includes processing for -- duplicated error messages, and other similar final adjustment of the -- list of error messages. Note that this procedure must be called before -- calling Compilation_Errors to determine if there were any errors. It -- is perfectly fine to call Finalize more than once, providing that the -- parameter Last_Call is set False for every call except the last call. -- This multiple call capability is used to do some processing that may -- generate messages. Call Finalize to eliminate duplicates and remove -- deleted warnings. Test for compilation errors using Compilation_Errors, -- then generate some more errors/warnings, call Finalize again to make -- sure that all duplicates in these new messages are dealt with, then -- finally call Output_Messages to output the final list of messages. The -- argument Last_Call must be set False on all calls except the last call, -- and must be set True on the last call (a value of True activates some -- processing that must only be done after all messages are posted). procedure Output_Messages; -- Output list of messages, including messages giving number of detected -- errors and warnings. procedure Error_Msg (Msg : String; Flag_Location : Source_Ptr); procedure Error_Msg (Msg : String; Flag_Span : Source_Span); procedure Error_Msg (Msg : String; Flag_Location : Source_Ptr; N : Node_Id); procedure Error_Msg (Msg : String; Flag_Span : Source_Span; N : Node_Id); -- Output a message at specified location. Can be called from the parser -- or the semantic analyzer. If N is set, points to the relevant node for -- this message. The version with a span is preferred whenever possible, -- in other cases the version with a location can still be used. procedure Error_Msg (Msg : String; Flag_Location : Source_Ptr; Is_Compile_Time_Pragma : Boolean); -- Same as Error_Msg (String, Source_Ptr) except Is_Compile_Time_Pragma -- lets the caller specify whether this is a Compile_Time_Warning or -- Compile_Time_Error pragma. procedure Error_Msg_S (Msg : String); -- Output a message at current scan pointer location. This routine can be -- called only from the parser, since it references Scan_Ptr. procedure Error_Msg_AP (Msg : String); -- Output a message just after the previous token. This routine can be -- called only from the parser, since it references Prev_Token_Ptr. procedure Error_Msg_BC (Msg : String); -- Output a message just before the current token. Note that the important -- difference between this and the previous routine is that the BC case -- posts a flag on the current line, whereas AP can post a flag at the -- end of the preceding line. This routine can be called only from the -- parser, since it references Token_Ptr. procedure Error_Msg_SC (Msg : String); -- Output a message at the start of the current token, unless we are at -- the end of file, in which case we always output the message after the -- last real token in the file. This routine can be called only from the -- parser, since it references Token_Ptr. procedure Error_Msg_SP (Msg : String); -- Output a message at the start of the previous token. This routine can -- be called only from the parser, since it references Prev_Token_Ptr. procedure Error_Msg_N (Msg : String; N : Node_Or_Entity_Id); -- Output a message at the Sloc of the given node. This routine can be -- called from the parser or the semantic analyzer, although the call from -- the latter is much more common (and is the most usual way of generating -- error messages from the analyzer). The message text may contain a -- single & insertion, which will reference the given node. The message is -- suppressed if the node N already has a message posted, or if it is a -- warning and N is an entity node for which warnings are suppressed. -- WARNING: There is a matching C declaration of this subprogram in fe.h procedure Error_Msg_F (Msg : String; N : Node_Id); -- Similar to Error_Msg_N except that the message is placed on the first -- node of the construct N (First_Node (N)). Note that this procedure uses -- Original_Node to look at the original source tree, since that's what we -- want for placing an error message flag in the right place. procedure Error_Msg_NE (Msg : String; N : Node_Or_Entity_Id; E : Node_Or_Entity_Id); -- Output a message at the Sloc of the given node N, with an insertion of -- the name from the given entity node E. This is used by the semantic -- routines, where this is a common error message situation. The Msg text -- will contain a & or } as usual to mark the insertion point. This -- routine can be called from the parser or the analyzer. -- WARNING: There is a matching C declaration of this subprogram in fe.h procedure Error_Msg_FE (Msg : String; N : Node_Id; E : Node_Or_Entity_Id); -- Same as Error_Msg_NE, except that the message is placed on the first -- node of the construct N (First_Node (N)). procedure Error_Msg_NEL (Msg : String; N : Node_Or_Entity_Id; E : Node_Or_Entity_Id; Flag_Location : Source_Ptr); procedure Error_Msg_NEL (Msg : String; N : Node_Or_Entity_Id; E : Node_Or_Entity_Id; Flag_Span : Source_Span); -- Exactly the same as Error_Msg_NE, except that the flag is placed at -- the specified Flag_Location/Flag_Span instead of at Sloc (N). procedure Error_Msg_NW (Eflag : Boolean; Msg : String; N : Node_Or_Entity_Id); -- This routine is used for posting a message conditionally. The message -- is posted (with the same effect as Error_Msg_N (Msg, N) if and only -- if Eflag is True and if the node N is within the main extended source -- unit and comes from source. Typically this is a warning mode flag. -- This routine can only be called during semantic analysis. It may not -- be called during parsing. procedure Change_Error_Text (Error_Id : Error_Msg_Id; New_Msg : String); -- The error message text of the message identified by Id is replaced by -- the given text. This text may contain insertion characters in the -- usual manner, and need not be the same length as the original text. procedure First_And_Last_Nodes (C : Node_Id; First_Node, Last_Node : out Node_Id); -- Given a construct C, finds the first and last node in the construct, -- i.e. the ones with the lowest and highest Sloc value. This is useful in -- placing error msgs. Note that this procedure uses Original_Node to look -- at the original source tree, since that's what we want for placing an -- error message flag in the right place. function First_Node (C : Node_Id) return Node_Id; -- Return the first output of First_And_Last_Nodes function First_Sloc (N : Node_Id) return Source_Ptr; -- Given the node for an expression, return a source pointer value that -- points to the start of the first token in the expression. In the case -- where the expression is parenthesized, an attempt is made to include -- the parentheses (i.e. to return the location of the initial paren). function Get_Ignore_Errors return Boolean; -- Return True if all error calls are ignored. function Last_Node (C : Node_Id) return Node_Id; -- Return the last output of First_And_Last_Nodes function Last_Sloc (N : Node_Id) return Source_Ptr; -- Given the node for an expression, return a source pointer value that -- points to the end of the last token in the expression. In the case -- where the expression is parenthesized, an attempt is made to include -- the parentheses (i.e. to return the location of the final paren). procedure Purge_Messages (From : Source_Ptr; To : Source_Ptr) renames Erroutc.Purge_Messages; -- All error messages whose location is in the range From .. To (not -- including the end points) will be deleted from the error listing. procedure Remove_Warning_Messages (N : Node_Id); -- Remove any warning messages corresponding to the Sloc of N or any -- of its descendant nodes. No effect if no such warnings. Note that -- style messages (identified by the fact that they start with "(style)") -- are not removed by this call. Basically the idea behind this procedure -- is to remove warnings about execution conditions from known dead code. procedure Remove_Warning_Messages (L : List_Id); -- Remove warnings on all elements of a list (Calls Remove_Warning_Messages -- on each element of the list, see above). procedure Reset_Warnings; -- Reset the counts related to warnings. This is used both to initialize -- these counts and to reset them after each phase of analysis for a given -- value of Opt.Warning_Mode in gnat2why. procedure Set_Ignore_Errors (To : Boolean); -- Following a call to this procedure with To=True, all error calls are -- ignored. A call with To=False restores the default treatment in which -- error calls are treated as usual (and as described in this spec). procedure Set_Warnings_Mode_Off (Loc : Source_Ptr; Reason : String_Id) renames Erroutc.Set_Warnings_Mode_Off; -- Called in response to a pragma Warnings (Off) to record the source -- location from which warnings are to be turned off. Reason is the -- Reason from the pragma, or the null string if none is given. procedure Set_Warnings_Mode_On (Loc : Source_Ptr) renames Erroutc.Set_Warnings_Mode_On; -- Called in response to a pragma Warnings (On) to record the source -- location from which warnings are to be turned back on. procedure Set_Specific_Warning_Off (Loc : Source_Ptr; Msg : String; Reason : String_Id; Config : Boolean; Used : Boolean := False) renames Erroutc.Set_Specific_Warning_Off; -- This is called in response to the two argument form of pragma Warnings -- where the first argument is OFF, and the second argument is a string -- which identifies a specific warning to be suppressed. The first argument -- is the start of the suppression range, and the second argument is the -- string from the pragma. Loc is the location of the pragma (which is the -- start of the range to suppress). Reason is the reason string from the -- pragma, or the null string if no reason is given. Config is True for the -- configuration pragma case (where there is no requirement for a matching -- OFF pragma). Used is set True to disable the check that the warning -- actually has the effect of suppressing a warning. procedure Set_Specific_Warning_On (Loc : Source_Ptr; Msg : String; Err : out Boolean) renames Erroutc.Set_Specific_Warning_On; -- This is called in response to the two argument form of pragma Warnings -- where the first argument is ON, and the second argument is the prefix -- of a specific warning to be suppressed. The first argument is the end -- of the suppression range, and the second argument is the string from -- the pragma. Err is set to True on return to report the error of no -- matching Warnings Off pragma preceding this one. function Compilation_Errors return Boolean; -- Returns True if errors have been detected, or warnings in -gnatwe (treat -- warnings as errors) mode. Note that it is mandatory to call Finalize -- before calling this routine. To account for changes to Warning_Mode in -- gnat2why between phases, the past or current presence of an error is -- recorded in a global variable at each call. procedure Error_Msg_CRT (Feature : String; N : Node_Id); -- Posts a non-fatal message on node N saying that the feature identified -- by the Feature argument is not supported in either configurable -- run-time mode or no run-time mode (as appropriate). In the former case, -- the name of the library is output if available. procedure Error_Msg_PT (E : Entity_Id; Iface_Prim : Entity_Id); -- Posts an error on protected type entry or subprogram E (referencing its -- overridden interface primitive Iface_Prim) indicating wrong mode of the -- first formal (RM 9.4(11.9/3)). procedure Error_Msg_Ada_2005_Extension (Extension : String); -- Analogous to Error_Msg_Ada_2012_Feature, but phrase the message using -- "extension" and not "feature". This routine is only used in the parser, -- so the error is always placed at the Token_Ptr. procedure Error_Msg_Ada_2012_Feature (Feature : String; Loc : Source_Ptr); -- If not operating in Ada 2012 mode or higher, posts errors complaining -- that Feature is only supported in Ada 2012, with appropriate suggestions -- to fix this. Loc is the location at which the flag is to be posted. -- Feature, which appears at the start of the first generated message, may -- contain error message insertion characters in the normal manner, and in -- particular may start with | to flag a non-serious error. procedure Error_Msg_Ada_2022_Feature (Feature : String; Loc : Source_Ptr); -- Analogous to Error_Msg_Ada_2012_Feature, for Ada 2022 procedure Error_Msg_GNAT_Extension (Extension : String); -- If not operating with extensions allowed, posts errors complaining -- that Extension is only supported when the -gnatX switch is enabled, -- with appropriate suggestions to fix it. procedure dmsg (Id : Error_Msg_Id) renames Erroutc.dmsg; -- Debugging routine to dump an error message ------------------------------------ -- SPARK Error Output Subprograms -- ------------------------------------ -- The following routines are intended to report semantic errors in SPARK -- constructs subject to aspect/pragma SPARK_Mode. Note that syntax errors -- must be reported using the Error_Msg_XXX routines. This allows for the -- partial analysis of SPARK features when they are disabled via SPARK_Mode -- set to "off". procedure SPARK_Msg_N (Msg : String; N : Node_Or_Entity_Id); pragma Inline (SPARK_Msg_N); -- Same as Error_Msg_N, but the error is suppressed if SPARK_Mode is Off. -- The routine is inlined because it acts as a simple wrapper. procedure SPARK_Msg_NE (Msg : String; N : Node_Or_Entity_Id; E : Node_Or_Entity_Id); pragma Inline (SPARK_Msg_NE); -- Same as Error_Msg_NE, but the error is suppressed if SPARK_Mode is Off. -- The routine is inlined because it acts as a simple wrapper. ------------------------------------------ -- Utility Interface for Casing Control -- ------------------------------------------ procedure Adjust_Name_Case (Buf : in out Bounded_String; Loc : Source_Ptr); -- Given a name stored in Buf, set proper casing. Loc is an associated -- source position, and if we can find a match between the name in Buf and -- the name at that source location, we copy the casing from the source, -- otherwise we set appropriate default casing. procedure Set_Identifier_Casing (Identifier_Name : System.Address; File_Name : System.Address); pragma Convention (C, Set_Identifier_Casing); -- This subprogram can be used by the back end for the purposes of -- concocting error messages that are not output via Errout, e.g. -- the messages generated by the gcc back end. -- -- The identifier is a null terminated string that represents the name of -- an identifier appearing in the source program. File_Name is a null -- terminated string giving the corresponding file name for the identifier -- as obtained from the front end by the use of Full_Debug_Name to the -- source file referenced by the corresponding source location value. On -- return, the name is in Name_Buffer, null terminated with Name_Len set. -- This name is the identifier name as passed, cased according to the -- default identifier casing for the given file. -- WARNING: There is a matching C declaration of this subprogram in fe.h function Is_Size_Too_Small_Message (S : String) return Boolean; Size_Too_Small_Message : constant String := "size for& too small, minimum allowed is ^"; -- This message is printed in Freeze and Sem_Ch13. We also test for it in -- the body of this package (see Special_Msg_Delete). -- Function Is_Size_Too_Small_Message tests for it by testing a prefix. -- The function and constant should be kept in synch. end Errout;
AdaCore/Ada_Drivers_Library
Ada
5,572
adb
------------------------------------------------------------------------------ -- -- -- Copyright (C) 2015, 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 Ada.Unchecked_Conversion; with STM32.Device; use STM32.Device; with STM32_SVD.PWR; use STM32_SVD.PWR; with STM32_SVD.RCC; use STM32_SVD.RCC; package body STM32.RCC is function To_AHB1RSTR_T is new Ada.Unchecked_Conversion (UInt32, AHB1RSTR_Register); function To_AHB2RSTR_T is new Ada.Unchecked_Conversion (UInt32, AHB2RSTR_Register); function To_APB1RSTR_T is new Ada.Unchecked_Conversion (UInt32, APB1RSTR_Register); function To_APB2RSTR_T is new Ada.Unchecked_Conversion (UInt32, APB2RSTR_Register); --------------------------------------------------------------------------- ------- Enable/Disable/Reset Routines ----------------------------------- --------------------------------------------------------------------------- procedure CRC_Clock_Enable is begin RCC_Periph.AHB1ENR.CRCEN := True; end CRC_Clock_Enable; procedure BKPSRAM_Clock_Enable is begin RCC_Periph.AHB1ENR.BKPSRAMEN := True; end BKPSRAM_Clock_Enable; procedure WWDG_Clock_Enable is begin RCC_Periph.APB1ENR.WWDGEN := True; end WWDG_Clock_Enable; procedure SYSCFG_Clock_Enable is begin RCC_Periph.APB2ENR.SYSCFGEN := True; end SYSCFG_Clock_Enable; procedure AHB1_Force_Reset is begin RCC_Periph.AHB1RSTR := To_AHB1RSTR_T (16#FFFF_FFFF#); end AHB1_Force_Reset; procedure AHB1_Release_Reset is begin RCC_Periph.AHB1RSTR := To_AHB1RSTR_T (0); end AHB1_Release_Reset; procedure AHB2_Force_Reset is begin RCC_Periph.AHB2RSTR := To_AHB2RSTR_T (16#FFFF_FFFF#); end AHB2_Force_Reset; procedure AHB2_Release_Reset is begin RCC_Periph.AHB2RSTR := To_AHB2RSTR_T (0); end AHB2_Release_Reset; procedure APB1_Force_Reset is begin RCC_Periph.APB1RSTR := To_APB1RSTR_T (16#FFFF_FFFF#); end APB1_Force_Reset; procedure APB1_Release_Reset is begin RCC_Periph.APB1RSTR := To_APB1RSTR_T (0); end APB1_Release_Reset; procedure APB2_Force_Reset is begin RCC_Periph.APB2RSTR := To_APB2RSTR_T (16#FFFF_FFFF#); end APB2_Force_Reset; procedure APB2_Release_Reset is begin RCC_Periph.APB2RSTR := To_APB2RSTR_T (0); end APB2_Release_Reset; procedure CRC_Force_Reset is begin RCC_Periph.AHB1RSTR.CRCRST := True; end CRC_Force_Reset; procedure CRC_Release_Reset is begin RCC_Periph.AHB1RSTR.CRCRST := False; end CRC_Release_Reset; procedure OTGFS_Force_Reset is begin RCC_Periph.AHB2RSTR.OTGFSRST := True; end OTGFS_Force_Reset; procedure OTGFS_Release_Reset is begin RCC_Periph.AHB2RSTR.OTGFSRST := False; end OTGFS_Release_Reset; procedure WWDG_Force_Reset is begin RCC_Periph.APB1RSTR.WWDGRST := True; end WWDG_Force_Reset; procedure WWDG_Release_Reset is begin RCC_Periph.APB1RSTR.WWDGRST := False; end WWDG_Release_Reset; procedure SYSCFG_Force_Reset is begin RCC_Periph.APB2RSTR.SYSCFGRST := True; end SYSCFG_Force_Reset; procedure SYSCFG_Release_Reset is begin RCC_Periph.APB2RSTR.SYSCFGRST := False; end SYSCFG_Release_Reset; end STM32.RCC;
zhmu/ananas
Ada
257
adb
-- { dg-do run } with assign_from_packed_pixels; use assign_from_packed_pixels; procedure assign_from_packed is A : Integer := Minus_One; Pos : Position; begin Pos := Pix.Pos; if A /= Minus_One then raise Program_Error; end if; end;
Fabien-Chouteau/samd51-hal
Ada
37,768
ads
pragma Style_Checks (Off); -- This spec has been automatically generated from ATSAMD51G19A.svd pragma Restrictions (No_Elaboration_Code); with HAL; with System; package SAM_SVD.OSCCTRL is pragma Preelaborate; --------------- -- Registers -- --------------- -- OSCCTRL_EVCTRL_CFDEO array type OSCCTRL_EVCTRL_CFDEO_Field_Array is array (0 .. 1) of Boolean with Component_Size => 1, Size => 2; -- Type definition for OSCCTRL_EVCTRL_CFDEO type OSCCTRL_EVCTRL_CFDEO_Field (As_Array : Boolean := False) is record case As_Array is when False => -- CFDEO as a value Val : HAL.UInt2; when True => -- CFDEO as an array Arr : OSCCTRL_EVCTRL_CFDEO_Field_Array; end case; end record with Unchecked_Union, Size => 2; for OSCCTRL_EVCTRL_CFDEO_Field use record Val at 0 range 0 .. 1; Arr at 0 range 0 .. 1; end record; -- Event Control type OSCCTRL_EVCTRL_Register is record -- Clock 0 Failure Detector Event Output Enable CFDEO : OSCCTRL_EVCTRL_CFDEO_Field := (As_Array => False, Val => 16#0#); -- unspecified Reserved_2_7 : HAL.UInt6 := 16#0#; end record with Volatile_Full_Access, Object_Size => 8, Bit_Order => System.Low_Order_First; for OSCCTRL_EVCTRL_Register use record CFDEO at 0 range 0 .. 1; Reserved_2_7 at 0 range 2 .. 7; end record; -- OSCCTRL_INTENCLR_XOSCRDY array type OSCCTRL_INTENCLR_XOSCRDY_Field_Array is array (0 .. 1) of Boolean with Component_Size => 1, Size => 2; -- Type definition for OSCCTRL_INTENCLR_XOSCRDY type OSCCTRL_INTENCLR_XOSCRDY_Field (As_Array : Boolean := False) is record case As_Array is when False => -- XOSCRDY as a value Val : HAL.UInt2; when True => -- XOSCRDY as an array Arr : OSCCTRL_INTENCLR_XOSCRDY_Field_Array; end case; end record with Unchecked_Union, Size => 2; for OSCCTRL_INTENCLR_XOSCRDY_Field use record Val at 0 range 0 .. 1; Arr at 0 range 0 .. 1; end record; -- OSCCTRL_INTENCLR_XOSCFAIL array type OSCCTRL_INTENCLR_XOSCFAIL_Field_Array is array (0 .. 1) of Boolean with Component_Size => 1, Size => 2; -- Type definition for OSCCTRL_INTENCLR_XOSCFAIL type OSCCTRL_INTENCLR_XOSCFAIL_Field (As_Array : Boolean := False) is record case As_Array is when False => -- XOSCFAIL as a value Val : HAL.UInt2; when True => -- XOSCFAIL as an array Arr : OSCCTRL_INTENCLR_XOSCFAIL_Field_Array; end case; end record with Unchecked_Union, Size => 2; for OSCCTRL_INTENCLR_XOSCFAIL_Field use record Val at 0 range 0 .. 1; Arr at 0 range 0 .. 1; end record; -- Interrupt Enable Clear type OSCCTRL_INTENCLR_Register is record -- XOSC 0 Ready Interrupt Enable XOSCRDY : OSCCTRL_INTENCLR_XOSCRDY_Field := (As_Array => False, Val => 16#0#); -- XOSC 0 Clock Failure Detector Interrupt Enable XOSCFAIL : OSCCTRL_INTENCLR_XOSCFAIL_Field := (As_Array => False, Val => 16#0#); -- unspecified Reserved_4_7 : HAL.UInt4 := 16#0#; -- DFLL Ready Interrupt Enable DFLLRDY : Boolean := False; -- DFLL Out Of Bounds Interrupt Enable DFLLOOB : Boolean := False; -- DFLL Lock Fine Interrupt Enable DFLLLCKF : Boolean := False; -- DFLL Lock Coarse Interrupt Enable DFLLLCKC : Boolean := False; -- DFLL Reference Clock Stopped Interrupt Enable DFLLRCS : Boolean := False; -- unspecified Reserved_13_15 : HAL.UInt3 := 16#0#; -- DPLL0 Lock Rise Interrupt Enable DPLL0LCKR : Boolean := False; -- DPLL0 Lock Fall Interrupt Enable DPLL0LCKF : Boolean := False; -- DPLL0 Lock Timeout Interrupt Enable DPLL0LTO : Boolean := False; -- DPLL0 Loop Divider Ratio Update Complete Interrupt Enable DPLL0LDRTO : Boolean := False; -- unspecified Reserved_20_23 : HAL.UInt4 := 16#0#; -- DPLL1 Lock Rise Interrupt Enable DPLL1LCKR : Boolean := False; -- DPLL1 Lock Fall Interrupt Enable DPLL1LCKF : Boolean := False; -- DPLL1 Lock Timeout Interrupt Enable DPLL1LTO : Boolean := False; -- DPLL1 Loop Divider Ratio Update Complete Interrupt Enable DPLL1LDRTO : Boolean := False; -- unspecified Reserved_28_31 : HAL.UInt4 := 16#0#; end record with Volatile_Full_Access, Object_Size => 32, Bit_Order => System.Low_Order_First; for OSCCTRL_INTENCLR_Register use record XOSCRDY at 0 range 0 .. 1; XOSCFAIL at 0 range 2 .. 3; Reserved_4_7 at 0 range 4 .. 7; DFLLRDY at 0 range 8 .. 8; DFLLOOB at 0 range 9 .. 9; DFLLLCKF at 0 range 10 .. 10; DFLLLCKC at 0 range 11 .. 11; DFLLRCS at 0 range 12 .. 12; Reserved_13_15 at 0 range 13 .. 15; DPLL0LCKR at 0 range 16 .. 16; DPLL0LCKF at 0 range 17 .. 17; DPLL0LTO at 0 range 18 .. 18; DPLL0LDRTO at 0 range 19 .. 19; Reserved_20_23 at 0 range 20 .. 23; DPLL1LCKR at 0 range 24 .. 24; DPLL1LCKF at 0 range 25 .. 25; DPLL1LTO at 0 range 26 .. 26; DPLL1LDRTO at 0 range 27 .. 27; Reserved_28_31 at 0 range 28 .. 31; end record; -- OSCCTRL_INTENSET_XOSCRDY array type OSCCTRL_INTENSET_XOSCRDY_Field_Array is array (0 .. 1) of Boolean with Component_Size => 1, Size => 2; -- Type definition for OSCCTRL_INTENSET_XOSCRDY type OSCCTRL_INTENSET_XOSCRDY_Field (As_Array : Boolean := False) is record case As_Array is when False => -- XOSCRDY as a value Val : HAL.UInt2; when True => -- XOSCRDY as an array Arr : OSCCTRL_INTENSET_XOSCRDY_Field_Array; end case; end record with Unchecked_Union, Size => 2; for OSCCTRL_INTENSET_XOSCRDY_Field use record Val at 0 range 0 .. 1; Arr at 0 range 0 .. 1; end record; -- OSCCTRL_INTENSET_XOSCFAIL array type OSCCTRL_INTENSET_XOSCFAIL_Field_Array is array (0 .. 1) of Boolean with Component_Size => 1, Size => 2; -- Type definition for OSCCTRL_INTENSET_XOSCFAIL type OSCCTRL_INTENSET_XOSCFAIL_Field (As_Array : Boolean := False) is record case As_Array is when False => -- XOSCFAIL as a value Val : HAL.UInt2; when True => -- XOSCFAIL as an array Arr : OSCCTRL_INTENSET_XOSCFAIL_Field_Array; end case; end record with Unchecked_Union, Size => 2; for OSCCTRL_INTENSET_XOSCFAIL_Field use record Val at 0 range 0 .. 1; Arr at 0 range 0 .. 1; end record; -- Interrupt Enable Set type OSCCTRL_INTENSET_Register is record -- XOSC 0 Ready Interrupt Enable XOSCRDY : OSCCTRL_INTENSET_XOSCRDY_Field := (As_Array => False, Val => 16#0#); -- XOSC 0 Clock Failure Detector Interrupt Enable XOSCFAIL : OSCCTRL_INTENSET_XOSCFAIL_Field := (As_Array => False, Val => 16#0#); -- unspecified Reserved_4_7 : HAL.UInt4 := 16#0#; -- DFLL Ready Interrupt Enable DFLLRDY : Boolean := False; -- DFLL Out Of Bounds Interrupt Enable DFLLOOB : Boolean := False; -- DFLL Lock Fine Interrupt Enable DFLLLCKF : Boolean := False; -- DFLL Lock Coarse Interrupt Enable DFLLLCKC : Boolean := False; -- DFLL Reference Clock Stopped Interrupt Enable DFLLRCS : Boolean := False; -- unspecified Reserved_13_15 : HAL.UInt3 := 16#0#; -- DPLL0 Lock Rise Interrupt Enable DPLL0LCKR : Boolean := False; -- DPLL0 Lock Fall Interrupt Enable DPLL0LCKF : Boolean := False; -- DPLL0 Lock Timeout Interrupt Enable DPLL0LTO : Boolean := False; -- DPLL0 Loop Divider Ratio Update Complete Interrupt Enable DPLL0LDRTO : Boolean := False; -- unspecified Reserved_20_23 : HAL.UInt4 := 16#0#; -- DPLL1 Lock Rise Interrupt Enable DPLL1LCKR : Boolean := False; -- DPLL1 Lock Fall Interrupt Enable DPLL1LCKF : Boolean := False; -- DPLL1 Lock Timeout Interrupt Enable DPLL1LTO : Boolean := False; -- DPLL1 Loop Divider Ratio Update Complete Interrupt Enable DPLL1LDRTO : Boolean := False; -- unspecified Reserved_28_31 : HAL.UInt4 := 16#0#; end record with Volatile_Full_Access, Object_Size => 32, Bit_Order => System.Low_Order_First; for OSCCTRL_INTENSET_Register use record XOSCRDY at 0 range 0 .. 1; XOSCFAIL at 0 range 2 .. 3; Reserved_4_7 at 0 range 4 .. 7; DFLLRDY at 0 range 8 .. 8; DFLLOOB at 0 range 9 .. 9; DFLLLCKF at 0 range 10 .. 10; DFLLLCKC at 0 range 11 .. 11; DFLLRCS at 0 range 12 .. 12; Reserved_13_15 at 0 range 13 .. 15; DPLL0LCKR at 0 range 16 .. 16; DPLL0LCKF at 0 range 17 .. 17; DPLL0LTO at 0 range 18 .. 18; DPLL0LDRTO at 0 range 19 .. 19; Reserved_20_23 at 0 range 20 .. 23; DPLL1LCKR at 0 range 24 .. 24; DPLL1LCKF at 0 range 25 .. 25; DPLL1LTO at 0 range 26 .. 26; DPLL1LDRTO at 0 range 27 .. 27; Reserved_28_31 at 0 range 28 .. 31; end record; -- OSCCTRL_INTFLAG_XOSCRDY array type OSCCTRL_INTFLAG_XOSCRDY_Field_Array is array (0 .. 1) of Boolean with Component_Size => 1, Size => 2; -- Type definition for OSCCTRL_INTFLAG_XOSCRDY type OSCCTRL_INTFLAG_XOSCRDY_Field (As_Array : Boolean := False) is record case As_Array is when False => -- XOSCRDY as a value Val : HAL.UInt2; when True => -- XOSCRDY as an array Arr : OSCCTRL_INTFLAG_XOSCRDY_Field_Array; end case; end record with Unchecked_Union, Size => 2; for OSCCTRL_INTFLAG_XOSCRDY_Field use record Val at 0 range 0 .. 1; Arr at 0 range 0 .. 1; end record; -- OSCCTRL_INTFLAG_XOSCFAIL array type OSCCTRL_INTFLAG_XOSCFAIL_Field_Array is array (0 .. 1) of Boolean with Component_Size => 1, Size => 2; -- Type definition for OSCCTRL_INTFLAG_XOSCFAIL type OSCCTRL_INTFLAG_XOSCFAIL_Field (As_Array : Boolean := False) is record case As_Array is when False => -- XOSCFAIL as a value Val : HAL.UInt2; when True => -- XOSCFAIL as an array Arr : OSCCTRL_INTFLAG_XOSCFAIL_Field_Array; end case; end record with Unchecked_Union, Size => 2; for OSCCTRL_INTFLAG_XOSCFAIL_Field use record Val at 0 range 0 .. 1; Arr at 0 range 0 .. 1; end record; -- Interrupt Flag Status and Clear type OSCCTRL_INTFLAG_Register is record -- XOSC 0 Ready XOSCRDY : OSCCTRL_INTFLAG_XOSCRDY_Field := (As_Array => False, Val => 16#0#); -- XOSC 0 Clock Failure Detector XOSCFAIL : OSCCTRL_INTFLAG_XOSCFAIL_Field := (As_Array => False, Val => 16#0#); -- unspecified Reserved_4_7 : HAL.UInt4 := 16#0#; -- DFLL Ready DFLLRDY : Boolean := False; -- DFLL Out Of Bounds DFLLOOB : Boolean := False; -- DFLL Lock Fine DFLLLCKF : Boolean := False; -- DFLL Lock Coarse DFLLLCKC : Boolean := False; -- DFLL Reference Clock Stopped DFLLRCS : Boolean := False; -- unspecified Reserved_13_15 : HAL.UInt3 := 16#0#; -- DPLL0 Lock Rise DPLL0LCKR : Boolean := False; -- DPLL0 Lock Fall DPLL0LCKF : Boolean := False; -- DPLL0 Lock Timeout DPLL0LTO : Boolean := False; -- DPLL0 Loop Divider Ratio Update Complete DPLL0LDRTO : Boolean := False; -- unspecified Reserved_20_23 : HAL.UInt4 := 16#0#; -- DPLL1 Lock Rise DPLL1LCKR : Boolean := False; -- DPLL1 Lock Fall DPLL1LCKF : Boolean := False; -- DPLL1 Lock Timeout DPLL1LTO : Boolean := False; -- DPLL1 Loop Divider Ratio Update Complete DPLL1LDRTO : Boolean := False; -- unspecified Reserved_28_31 : HAL.UInt4 := 16#0#; end record with Volatile_Full_Access, Object_Size => 32, Bit_Order => System.Low_Order_First; for OSCCTRL_INTFLAG_Register use record XOSCRDY at 0 range 0 .. 1; XOSCFAIL at 0 range 2 .. 3; Reserved_4_7 at 0 range 4 .. 7; DFLLRDY at 0 range 8 .. 8; DFLLOOB at 0 range 9 .. 9; DFLLLCKF at 0 range 10 .. 10; DFLLLCKC at 0 range 11 .. 11; DFLLRCS at 0 range 12 .. 12; Reserved_13_15 at 0 range 13 .. 15; DPLL0LCKR at 0 range 16 .. 16; DPLL0LCKF at 0 range 17 .. 17; DPLL0LTO at 0 range 18 .. 18; DPLL0LDRTO at 0 range 19 .. 19; Reserved_20_23 at 0 range 20 .. 23; DPLL1LCKR at 0 range 24 .. 24; DPLL1LCKF at 0 range 25 .. 25; DPLL1LTO at 0 range 26 .. 26; DPLL1LDRTO at 0 range 27 .. 27; Reserved_28_31 at 0 range 28 .. 31; end record; -- OSCCTRL_STATUS_XOSCRDY array type OSCCTRL_STATUS_XOSCRDY_Field_Array is array (0 .. 1) of Boolean with Component_Size => 1, Size => 2; -- Type definition for OSCCTRL_STATUS_XOSCRDY type OSCCTRL_STATUS_XOSCRDY_Field (As_Array : Boolean := False) is record case As_Array is when False => -- XOSCRDY as a value Val : HAL.UInt2; when True => -- XOSCRDY as an array Arr : OSCCTRL_STATUS_XOSCRDY_Field_Array; end case; end record with Unchecked_Union, Size => 2; for OSCCTRL_STATUS_XOSCRDY_Field use record Val at 0 range 0 .. 1; Arr at 0 range 0 .. 1; end record; -- OSCCTRL_STATUS_XOSCFAIL array type OSCCTRL_STATUS_XOSCFAIL_Field_Array is array (0 .. 1) of Boolean with Component_Size => 1, Size => 2; -- Type definition for OSCCTRL_STATUS_XOSCFAIL type OSCCTRL_STATUS_XOSCFAIL_Field (As_Array : Boolean := False) is record case As_Array is when False => -- XOSCFAIL as a value Val : HAL.UInt2; when True => -- XOSCFAIL as an array Arr : OSCCTRL_STATUS_XOSCFAIL_Field_Array; end case; end record with Unchecked_Union, Size => 2; for OSCCTRL_STATUS_XOSCFAIL_Field use record Val at 0 range 0 .. 1; Arr at 0 range 0 .. 1; end record; -- OSCCTRL_STATUS_XOSCCKSW array type OSCCTRL_STATUS_XOSCCKSW_Field_Array is array (0 .. 1) of Boolean with Component_Size => 1, Size => 2; -- Type definition for OSCCTRL_STATUS_XOSCCKSW type OSCCTRL_STATUS_XOSCCKSW_Field (As_Array : Boolean := False) is record case As_Array is when False => -- XOSCCKSW as a value Val : HAL.UInt2; when True => -- XOSCCKSW as an array Arr : OSCCTRL_STATUS_XOSCCKSW_Field_Array; end case; end record with Unchecked_Union, Size => 2; for OSCCTRL_STATUS_XOSCCKSW_Field use record Val at 0 range 0 .. 1; Arr at 0 range 0 .. 1; end record; -- Status type OSCCTRL_STATUS_Register is record -- Read-only. XOSC 0 Ready XOSCRDY : OSCCTRL_STATUS_XOSCRDY_Field; -- Read-only. XOSC 0 Clock Failure Detector XOSCFAIL : OSCCTRL_STATUS_XOSCFAIL_Field; -- Read-only. XOSC 0 Clock Switch XOSCCKSW : OSCCTRL_STATUS_XOSCCKSW_Field; -- unspecified Reserved_6_7 : HAL.UInt2; -- Read-only. DFLL Ready DFLLRDY : Boolean; -- Read-only. DFLL Out Of Bounds DFLLOOB : Boolean; -- Read-only. DFLL Lock Fine DFLLLCKF : Boolean; -- Read-only. DFLL Lock Coarse DFLLLCKC : Boolean; -- Read-only. DFLL Reference Clock Stopped DFLLRCS : Boolean; -- unspecified Reserved_13_15 : HAL.UInt3; -- Read-only. DPLL0 Lock Rise DPLL0LCKR : Boolean; -- Read-only. DPLL0 Lock Fall DPLL0LCKF : Boolean; -- Read-only. DPLL0 Timeout DPLL0TO : Boolean; -- Read-only. DPLL0 Loop Divider Ratio Update Complete DPLL0LDRTO : Boolean; -- unspecified Reserved_20_23 : HAL.UInt4; -- Read-only. DPLL1 Lock Rise DPLL1LCKR : Boolean; -- Read-only. DPLL1 Lock Fall DPLL1LCKF : Boolean; -- Read-only. DPLL1 Timeout DPLL1TO : Boolean; -- Read-only. DPLL1 Loop Divider Ratio Update Complete DPLL1LDRTO : Boolean; -- unspecified Reserved_28_31 : HAL.UInt4; end record with Volatile_Full_Access, Object_Size => 32, Bit_Order => System.Low_Order_First; for OSCCTRL_STATUS_Register use record XOSCRDY at 0 range 0 .. 1; XOSCFAIL at 0 range 2 .. 3; XOSCCKSW at 0 range 4 .. 5; Reserved_6_7 at 0 range 6 .. 7; DFLLRDY at 0 range 8 .. 8; DFLLOOB at 0 range 9 .. 9; DFLLLCKF at 0 range 10 .. 10; DFLLLCKC at 0 range 11 .. 11; DFLLRCS at 0 range 12 .. 12; Reserved_13_15 at 0 range 13 .. 15; DPLL0LCKR at 0 range 16 .. 16; DPLL0LCKF at 0 range 17 .. 17; DPLL0TO at 0 range 18 .. 18; DPLL0LDRTO at 0 range 19 .. 19; Reserved_20_23 at 0 range 20 .. 23; DPLL1LCKR at 0 range 24 .. 24; DPLL1LCKF at 0 range 25 .. 25; DPLL1TO at 0 range 26 .. 26; DPLL1LDRTO at 0 range 27 .. 27; Reserved_28_31 at 0 range 28 .. 31; end record; subtype OSCCTRL_XOSCCTRL_IPTAT_Field is HAL.UInt2; subtype OSCCTRL_XOSCCTRL_IMULT_Field is HAL.UInt4; -- Start-Up Time type XOSCCTRL_STARTUPSelect is (-- 31 us CYCLE1, -- 61 us CYCLE2, -- 122 us CYCLE4, -- 244 us CYCLE8, -- 488 us CYCLE16, -- 977 us CYCLE32, -- 1953 us CYCLE64, -- 3906 us CYCLE128, -- 7813 us CYCLE256, -- 15625 us CYCLE512, -- 31250 us CYCLE1024, -- 62500 us CYCLE2048, -- 125000 us CYCLE4096, -- 250000 us CYCLE8192, -- 500000 us CYCLE16384, -- 1000000 us CYCLE32768) with Size => 4; for XOSCCTRL_STARTUPSelect use (CYCLE1 => 0, CYCLE2 => 1, CYCLE4 => 2, CYCLE8 => 3, CYCLE16 => 4, CYCLE32 => 5, CYCLE64 => 6, CYCLE128 => 7, CYCLE256 => 8, CYCLE512 => 9, CYCLE1024 => 10, CYCLE2048 => 11, CYCLE4096 => 12, CYCLE8192 => 13, CYCLE16384 => 14, CYCLE32768 => 15); -- Clock Failure Detector Prescaler type XOSCCTRL_CFDPRESCSelect is (-- 48 MHz DIV1, -- 24 MHz DIV2, -- 12 MHz DIV4, -- 6 MHz DIV8, -- 3 MHz DIV16, -- 1.5 MHz DIV32, -- 0.75 MHz DIV64, -- 0.3125 MHz DIV128) with Size => 4; for XOSCCTRL_CFDPRESCSelect use (DIV1 => 0, DIV2 => 1, DIV4 => 2, DIV8 => 3, DIV16 => 4, DIV32 => 5, DIV64 => 6, DIV128 => 7); -- External Multipurpose Crystal Oscillator Control type OSCCTRL_XOSCCTRL_Register is record -- unspecified Reserved_0_0 : HAL.Bit := 16#0#; -- Oscillator Enable ENABLE : Boolean := False; -- Crystal Oscillator Enable XTALEN : Boolean := False; -- unspecified Reserved_3_5 : HAL.UInt3 := 16#0#; -- Run in Standby RUNSTDBY : Boolean := False; -- On Demand Control ONDEMAND : Boolean := True; -- Low Buffer Gain Enable LOWBUFGAIN : Boolean := False; -- Oscillator Current Reference IPTAT : OSCCTRL_XOSCCTRL_IPTAT_Field := 16#0#; -- Oscillator Current Multiplier IMULT : OSCCTRL_XOSCCTRL_IMULT_Field := 16#0#; -- Automatic Loop Control Enable ENALC : Boolean := False; -- Clock Failure Detector Enable CFDEN : Boolean := False; -- Xosc Clock Switch Enable SWBEN : Boolean := False; -- unspecified Reserved_18_19 : HAL.UInt2 := 16#0#; -- Start-Up Time STARTUP : XOSCCTRL_STARTUPSelect := SAM_SVD.OSCCTRL.CYCLE1; -- Clock Failure Detector Prescaler CFDPRESC : XOSCCTRL_CFDPRESCSelect := SAM_SVD.OSCCTRL.DIV1; -- unspecified Reserved_28_31 : HAL.UInt4 := 16#0#; end record with Volatile_Full_Access, Object_Size => 32, Bit_Order => System.Low_Order_First; for OSCCTRL_XOSCCTRL_Register use record Reserved_0_0 at 0 range 0 .. 0; ENABLE at 0 range 1 .. 1; XTALEN at 0 range 2 .. 2; Reserved_3_5 at 0 range 3 .. 5; RUNSTDBY at 0 range 6 .. 6; ONDEMAND at 0 range 7 .. 7; LOWBUFGAIN at 0 range 8 .. 8; IPTAT at 0 range 9 .. 10; IMULT at 0 range 11 .. 14; ENALC at 0 range 15 .. 15; CFDEN at 0 range 16 .. 16; SWBEN at 0 range 17 .. 17; Reserved_18_19 at 0 range 18 .. 19; STARTUP at 0 range 20 .. 23; CFDPRESC at 0 range 24 .. 27; Reserved_28_31 at 0 range 28 .. 31; end record; -- External Multipurpose Crystal Oscillator Control type OSCCTRL_XOSCCTRL_Registers is array (0 .. 1) of OSCCTRL_XOSCCTRL_Register; -- DFLL48M Control A type OSCCTRL_DFLLCTRLA_Register is record -- unspecified Reserved_0_0 : HAL.Bit := 16#0#; -- DFLL Enable ENABLE : Boolean := True; -- unspecified Reserved_2_5 : HAL.UInt4 := 16#0#; -- Run in Standby RUNSTDBY : Boolean := False; -- On Demand Control ONDEMAND : Boolean := True; end record with Volatile_Full_Access, Object_Size => 8, Bit_Order => System.Low_Order_First; for OSCCTRL_DFLLCTRLA_Register use record Reserved_0_0 at 0 range 0 .. 0; ENABLE at 0 range 1 .. 1; Reserved_2_5 at 0 range 2 .. 5; RUNSTDBY at 0 range 6 .. 6; ONDEMAND at 0 range 7 .. 7; end record; -- DFLL48M Control B type OSCCTRL_DFLLCTRLB_Register is record -- Operating Mode Selection MODE : Boolean := False; -- Stable DFLL Frequency STABLE : Boolean := False; -- Lose Lock After Wake LLAW : Boolean := False; -- USB Clock Recovery Mode USBCRM : Boolean := False; -- Chill Cycle Disable CCDIS : Boolean := False; -- Quick Lock Disable QLDIS : Boolean := False; -- Bypass Coarse Lock BPLCKC : Boolean := False; -- Wait Lock WAITLOCK : Boolean := False; end record with Volatile_Full_Access, Object_Size => 8, Bit_Order => System.Low_Order_First; for OSCCTRL_DFLLCTRLB_Register use record MODE at 0 range 0 .. 0; STABLE at 0 range 1 .. 1; LLAW at 0 range 2 .. 2; USBCRM at 0 range 3 .. 3; CCDIS at 0 range 4 .. 4; QLDIS at 0 range 5 .. 5; BPLCKC at 0 range 6 .. 6; WAITLOCK at 0 range 7 .. 7; end record; subtype OSCCTRL_DFLLVAL_FINE_Field is HAL.UInt8; subtype OSCCTRL_DFLLVAL_COARSE_Field is HAL.UInt6; subtype OSCCTRL_DFLLVAL_DIFF_Field is HAL.UInt16; -- DFLL48M Value type OSCCTRL_DFLLVAL_Register is record -- Fine Value FINE : OSCCTRL_DFLLVAL_FINE_Field := 16#0#; -- unspecified Reserved_8_9 : HAL.UInt2 := 16#0#; -- Coarse Value COARSE : OSCCTRL_DFLLVAL_COARSE_Field := 16#0#; -- Multiplication Ratio Difference DIFF : OSCCTRL_DFLLVAL_DIFF_Field := 16#0#; end record with Volatile_Full_Access, Object_Size => 32, Bit_Order => System.Low_Order_First; for OSCCTRL_DFLLVAL_Register use record FINE at 0 range 0 .. 7; Reserved_8_9 at 0 range 8 .. 9; COARSE at 0 range 10 .. 15; DIFF at 0 range 16 .. 31; end record; subtype OSCCTRL_DFLLMUL_MUL_Field is HAL.UInt16; subtype OSCCTRL_DFLLMUL_FSTEP_Field is HAL.UInt8; subtype OSCCTRL_DFLLMUL_CSTEP_Field is HAL.UInt6; -- DFLL48M Multiplier type OSCCTRL_DFLLMUL_Register is record -- DFLL Multiply Factor MUL : OSCCTRL_DFLLMUL_MUL_Field := 16#0#; -- Fine Maximum Step FSTEP : OSCCTRL_DFLLMUL_FSTEP_Field := 16#0#; -- unspecified Reserved_24_25 : HAL.UInt2 := 16#0#; -- Coarse Maximum Step CSTEP : OSCCTRL_DFLLMUL_CSTEP_Field := 16#0#; end record with Volatile_Full_Access, Object_Size => 32, Bit_Order => System.Low_Order_First; for OSCCTRL_DFLLMUL_Register use record MUL at 0 range 0 .. 15; FSTEP at 0 range 16 .. 23; Reserved_24_25 at 0 range 24 .. 25; CSTEP at 0 range 26 .. 31; end record; -- DFLL48M Synchronization type OSCCTRL_DFLLSYNC_Register is record -- unspecified Reserved_0_0 : HAL.Bit := 16#0#; -- ENABLE Synchronization Busy ENABLE : Boolean := False; -- DFLLCTRLB Synchronization Busy DFLLCTRLB : Boolean := False; -- DFLLVAL Synchronization Busy DFLLVAL : Boolean := False; -- DFLLMUL Synchronization Busy DFLLMUL : Boolean := False; -- unspecified Reserved_5_7 : HAL.UInt3 := 16#0#; end record with Volatile_Full_Access, Object_Size => 8, Bit_Order => System.Low_Order_First; for OSCCTRL_DFLLSYNC_Register use record Reserved_0_0 at 0 range 0 .. 0; ENABLE at 0 range 1 .. 1; DFLLCTRLB at 0 range 2 .. 2; DFLLVAL at 0 range 3 .. 3; DFLLMUL at 0 range 4 .. 4; Reserved_5_7 at 0 range 5 .. 7; end record; -------------------------------------- -- OSCCTRL_DPLL cluster's Registers -- -------------------------------------- -- DPLL Control A type OSCCTRL_DPLLCTRLA_OSCCTRL_DPLL_Register is record -- unspecified Reserved_0_0 : HAL.Bit := 16#0#; -- DPLL Enable ENABLE : Boolean := False; -- unspecified Reserved_2_5 : HAL.UInt4 := 16#0#; -- Run in Standby RUNSTDBY : Boolean := False; -- On Demand Control ONDEMAND : Boolean := True; end record with Volatile_Full_Access, Object_Size => 8, Bit_Order => System.Low_Order_First; for OSCCTRL_DPLLCTRLA_OSCCTRL_DPLL_Register use record Reserved_0_0 at 0 range 0 .. 0; ENABLE at 0 range 1 .. 1; Reserved_2_5 at 0 range 2 .. 5; RUNSTDBY at 0 range 6 .. 6; ONDEMAND at 0 range 7 .. 7; end record; subtype OSCCTRL_DPLLRATIO_OSCCTRL_DPLL_LDR_Field is HAL.UInt13; subtype OSCCTRL_DPLLRATIO_OSCCTRL_DPLL_LDRFRAC_Field is HAL.UInt5; -- DPLL Ratio Control type OSCCTRL_DPLLRATIO_OSCCTRL_DPLL_Register is record -- Loop Divider Ratio LDR : OSCCTRL_DPLLRATIO_OSCCTRL_DPLL_LDR_Field := 16#0#; -- unspecified Reserved_13_15 : HAL.UInt3 := 16#0#; -- Loop Divider Ratio Fractional Part LDRFRAC : OSCCTRL_DPLLRATIO_OSCCTRL_DPLL_LDRFRAC_Field := 16#0#; -- unspecified Reserved_21_31 : HAL.UInt11 := 16#0#; end record with Volatile_Full_Access, Object_Size => 32, Bit_Order => System.Low_Order_First; for OSCCTRL_DPLLRATIO_OSCCTRL_DPLL_Register use record LDR at 0 range 0 .. 12; Reserved_13_15 at 0 range 13 .. 15; LDRFRAC at 0 range 16 .. 20; Reserved_21_31 at 0 range 21 .. 31; end record; -- Proportional Integral Filter Selection type DPLLCTRLB_FILTERSelect is (-- Bandwidth = 92.7Khz and Damping Factor = 0.76 FILTER1, -- Bandwidth = 131Khz and Damping Factor = 1.08 FILTER2, -- Bandwidth = 46.4Khz and Damping Factor = 0.38 FILTER3, -- Bandwidth = 65.6Khz and Damping Factor = 0.54 FILTER4, -- Bandwidth = 131Khz and Damping Factor = 0.56 FILTER5, -- Bandwidth = 185Khz and Damping Factor = 0.79 FILTER6, -- Bandwidth = 65.6Khz and Damping Factor = 0.28 FILTER7, -- Bandwidth = 92.7Khz and Damping Factor = 0.39 FILTER8, -- Bandwidth = 46.4Khz and Damping Factor = 1.49 FILTER9, -- Bandwidth = 65.6Khz and Damping Factor = 2.11 FILTER10, -- Bandwidth = 23.2Khz and Damping Factor = 0.75 FILTER11, -- Bandwidth = 32.8Khz and Damping Factor = 1.06 FILTER12, -- Bandwidth = 65.6Khz and Damping Factor = 1.07 FILTER13, -- Bandwidth = 92.7Khz and Damping Factor = 1.51 FILTER14, -- Bandwidth = 32.8Khz and Damping Factor = 0.53 FILTER15, -- Bandwidth = 46.4Khz and Damping Factor = 0.75 FILTER16) with Size => 4; for DPLLCTRLB_FILTERSelect use (FILTER1 => 0, FILTER2 => 1, FILTER3 => 2, FILTER4 => 3, FILTER5 => 4, FILTER6 => 5, FILTER7 => 6, FILTER8 => 7, FILTER9 => 8, FILTER10 => 9, FILTER11 => 10, FILTER12 => 11, FILTER13 => 12, FILTER14 => 13, FILTER15 => 14, FILTER16 => 15); -- Reference Clock Selection type DPLLCTRLB_REFCLKSelect is (-- Dedicated GCLK clock reference GCLK, -- XOSC32K clock reference XOSC32, -- XOSC0 clock reference XOSC0, -- XOSC1 clock reference XOSC1) with Size => 3; for DPLLCTRLB_REFCLKSelect use (GCLK => 0, XOSC32 => 1, XOSC0 => 2, XOSC1 => 3); -- Lock Time type DPLLCTRLB_LTIMESelect is (-- No time-out. Automatic lock DEFAULT, -- Time-out if no lock within 800us Val_800US, -- Time-out if no lock within 900us Val_900US, -- Time-out if no lock within 1ms Val_1MS, -- Time-out if no lock within 1.1ms Val_1P1MS) with Size => 3; for DPLLCTRLB_LTIMESelect use (DEFAULT => 0, Val_800US => 4, Val_900US => 5, Val_1MS => 6, Val_1P1MS => 7); -- Sigma-Delta DCO Filter Selection type DPLLCTRLB_DCOFILTERSelect is (-- Capacitor(pF) = 0.5 and Bandwidth Fn (MHz) = 3.21 FILTER1, -- Capacitor(pF) = 1 and Bandwidth Fn (MHz) = 1.6 FILTER2, -- Capacitor(pF) = 1.5 and Bandwidth Fn (MHz) = 1.1 FILTER3, -- Capacitor(pF) = 2 and Bandwidth Fn (MHz) = 0.8 FILTER4, -- Capacitor(pF) = 2.5 and Bandwidth Fn (MHz) = 0.64 FILTER5, -- Capacitor(pF) = 3 and Bandwidth Fn (MHz) = 0.55 FILTER6, -- Capacitor(pF) = 3.5 and Bandwidth Fn (MHz) = 0.45 FILTER7, -- Capacitor(pF) = 4 and Bandwidth Fn (MHz) = 0.4 FILTER8) with Size => 3; for DPLLCTRLB_DCOFILTERSelect use (FILTER1 => 0, FILTER2 => 1, FILTER3 => 2, FILTER4 => 3, FILTER5 => 4, FILTER6 => 5, FILTER7 => 6, FILTER8 => 7); subtype OSCCTRL_DPLLCTRLB_OSCCTRL_DPLL_DIV_Field is HAL.UInt11; -- DPLL Control B type OSCCTRL_DPLLCTRLB_OSCCTRL_DPLL_Register is record -- Proportional Integral Filter Selection FILTER : DPLLCTRLB_FILTERSelect := SAM_SVD.OSCCTRL.FILTER1; -- Wake Up Fast WUF : Boolean := False; -- Reference Clock Selection REFCLK : DPLLCTRLB_REFCLKSelect := SAM_SVD.OSCCTRL.XOSC32; -- Lock Time LTIME : DPLLCTRLB_LTIMESelect := SAM_SVD.OSCCTRL.DEFAULT; -- Lock Bypass LBYPASS : Boolean := False; -- Sigma-Delta DCO Filter Selection DCOFILTER : DPLLCTRLB_DCOFILTERSelect := SAM_SVD.OSCCTRL.FILTER1; -- DCO Filter Enable DCOEN : Boolean := False; -- Clock Divider DIV : OSCCTRL_DPLLCTRLB_OSCCTRL_DPLL_DIV_Field := 16#0#; -- unspecified Reserved_27_31 : HAL.UInt5 := 16#0#; end record with Volatile_Full_Access, Object_Size => 32, Bit_Order => System.Low_Order_First; for OSCCTRL_DPLLCTRLB_OSCCTRL_DPLL_Register use record FILTER at 0 range 0 .. 3; WUF at 0 range 4 .. 4; REFCLK at 0 range 5 .. 7; LTIME at 0 range 8 .. 10; LBYPASS at 0 range 11 .. 11; DCOFILTER at 0 range 12 .. 14; DCOEN at 0 range 15 .. 15; DIV at 0 range 16 .. 26; Reserved_27_31 at 0 range 27 .. 31; end record; -- DPLL Synchronization Busy type OSCCTRL_DPLLSYNCBUSY_OSCCTRL_DPLL_Register is record -- unspecified Reserved_0_0 : HAL.Bit; -- Read-only. DPLL Enable Synchronization Status ENABLE : Boolean; -- Read-only. DPLL Loop Divider Ratio Synchronization Status DPLLRATIO : Boolean; -- unspecified Reserved_3_31 : HAL.UInt29; end record with Volatile_Full_Access, Object_Size => 32, Bit_Order => System.Low_Order_First; for OSCCTRL_DPLLSYNCBUSY_OSCCTRL_DPLL_Register use record Reserved_0_0 at 0 range 0 .. 0; ENABLE at 0 range 1 .. 1; DPLLRATIO at 0 range 2 .. 2; Reserved_3_31 at 0 range 3 .. 31; end record; -- DPLL Status type OSCCTRL_DPLLSTATUS_OSCCTRL_DPLL_Register is record -- Read-only. DPLL Lock Status LOCK : Boolean; -- Read-only. DPLL Clock Ready CLKRDY : Boolean; -- unspecified Reserved_2_31 : HAL.UInt30; end record with Volatile_Full_Access, Object_Size => 32, Bit_Order => System.Low_Order_First; for OSCCTRL_DPLLSTATUS_OSCCTRL_DPLL_Register use record LOCK at 0 range 0 .. 0; CLKRDY at 0 range 1 .. 1; Reserved_2_31 at 0 range 2 .. 31; end record; type OSCCTRL_DPLL_Cluster is record -- DPLL Control A DPLLCTRLA : aliased OSCCTRL_DPLLCTRLA_OSCCTRL_DPLL_Register; -- DPLL Ratio Control DPLLRATIO : aliased OSCCTRL_DPLLRATIO_OSCCTRL_DPLL_Register; -- DPLL Control B DPLLCTRLB : aliased OSCCTRL_DPLLCTRLB_OSCCTRL_DPLL_Register; -- DPLL Synchronization Busy DPLLSYNCBUSY : aliased OSCCTRL_DPLLSYNCBUSY_OSCCTRL_DPLL_Register; -- DPLL Status DPLLSTATUS : aliased OSCCTRL_DPLLSTATUS_OSCCTRL_DPLL_Register; end record with Size => 160; for OSCCTRL_DPLL_Cluster use record DPLLCTRLA at 16#0# range 0 .. 7; DPLLRATIO at 16#4# range 0 .. 31; DPLLCTRLB at 16#8# range 0 .. 31; DPLLSYNCBUSY at 16#C# range 0 .. 31; DPLLSTATUS at 16#10# range 0 .. 31; end record; type OSCCTRL_DPLL_Clusters is array (0 .. 1) of OSCCTRL_DPLL_Cluster; ----------------- -- Peripherals -- ----------------- -- Oscillators Control type OSCCTRL_Peripheral is record -- Event Control EVCTRL : aliased OSCCTRL_EVCTRL_Register; -- Interrupt Enable Clear INTENCLR : aliased OSCCTRL_INTENCLR_Register; -- Interrupt Enable Set INTENSET : aliased OSCCTRL_INTENSET_Register; -- Interrupt Flag Status and Clear INTFLAG : aliased OSCCTRL_INTFLAG_Register; -- Status STATUS : aliased OSCCTRL_STATUS_Register; -- External Multipurpose Crystal Oscillator Control XOSCCTRL : aliased OSCCTRL_XOSCCTRL_Registers; -- DFLL48M Control A DFLLCTRLA : aliased OSCCTRL_DFLLCTRLA_Register; -- DFLL48M Control B DFLLCTRLB : aliased OSCCTRL_DFLLCTRLB_Register; -- DFLL48M Value DFLLVAL : aliased OSCCTRL_DFLLVAL_Register; -- DFLL48M Multiplier DFLLMUL : aliased OSCCTRL_DFLLMUL_Register; -- DFLL48M Synchronization DFLLSYNC : aliased OSCCTRL_DFLLSYNC_Register; OSCCTRL_DPLL : aliased OSCCTRL_DPLL_Clusters; end record with Volatile; for OSCCTRL_Peripheral use record EVCTRL at 16#0# range 0 .. 7; INTENCLR at 16#4# range 0 .. 31; INTENSET at 16#8# range 0 .. 31; INTFLAG at 16#C# range 0 .. 31; STATUS at 16#10# range 0 .. 31; XOSCCTRL at 16#14# range 0 .. 63; DFLLCTRLA at 16#1C# range 0 .. 7; DFLLCTRLB at 16#20# range 0 .. 7; DFLLVAL at 16#24# range 0 .. 31; DFLLMUL at 16#28# range 0 .. 31; DFLLSYNC at 16#2C# range 0 .. 7; OSCCTRL_DPLL at 16#30# range 0 .. 319; end record; -- Oscillators Control OSCCTRL_Periph : aliased OSCCTRL_Peripheral with Import, Address => OSCCTRL_Base; end SAM_SVD.OSCCTRL;
sparre/Command-Line-Parser-Generator
Ada
1,134
ads
-- Copyright: JSA Research & Innovation <[email protected]> -- License: Beer Ware pragma License (Unrestricted); with Command_Line_Parser_Generator.Identifier_Set; package Command_Line_Parser_Generator.Zsh_Argument_Pattern is type Kinds is (Files, Directories, Enumeration, Anything, Flag); subtype Simple_Kinds is Kinds with Static_Predicate => Simple_Kinds /= Enumeration; type Instance is tagged private; function Create (Kind : in Simple_Kinds) return Instance; function Create_Enumeration (Values : in Identifier_Set.Instance) return Instance; function "+" (Kind : in Simple_Kinds) return Instance renames Create; function Kind (Item : in Instance) return Kinds; function Values (Item : in Instance) return Identifier_Set.Instance; function "or" (Left, Right : Instance) return Instance; function Image (Item : in Instance) return Wide_String; private type Instance is tagged record Kind : Kinds := Anything; Values : Identifier_Set.Instance; end record; end Command_Line_Parser_Generator.Zsh_Argument_Pattern;
AdaCore/training_material
Ada
5,306
adb
----------------------------------------------------------------------- -- Ada Labs -- -- -- -- Copyright (C) 2008-2009, AdaCore -- -- -- -- Labs is free software; you can redistribute it and/or modify it -- -- under the terms of the GNU General Public License as published by -- -- the Free Software Foundation; either version 2 of the License, or -- -- (at your option) any later version. -- -- -- -- This program is distributed in the hope that it will be useful, -- -- but WITHOUT ANY WARRANTY; without even the implied warranty of -- -- MERCHANTABILITY or FITNESS FOR A PARTICULAR PURPOSE. See the GNU -- -- General Public License for more details. You should have received -- -- a copy of the GNU General Public License along with this program; -- -- if not, write to the Free Software Foundation, Inc., 59 Temple -- -- Place - Suite 330, Boston, MA 02111-1307, USA. -- ----------------------------------------------------------------------- with Ada.Real_Time; use Ada.Real_Time; with Solar_System; use Solar_System; with Display; use Display; with Display.Basic; use Display.Basic; with My_Solar_System; use My_Solar_System; with Solar_System.Graphics; use Solar_System.Graphics; procedure Main is -- declare a variable Next of type Time to store the Next step time Next : Time; -- declare a constant Period of 40 milliseconds of type Time_Span defining the loop period Period : constant Time_Span := Milliseconds (40); -- reference to the application window Window : Window_ID; -- reference to the graphical canvas associated with the application window Canvas : Canvas_ID; begin -- Create the main window Window := Create_Window(Width => 240, Height => 320, Name => "Solar System"); -- retrieve the graphical canvas associated with the main window Canvas := Get_Canvas (Window); -- initialize Bodies using Init_Body procedure Init_Body (B => Get_Body(Sun, Bodies'Access), Radius => 20.0, Color => Yellow, Distance => 0.0, Angle => 0.0, Speed => 0.0, Turns_Around => Get_Body(Sun, Bodies'Access)); Init_Body (B => Get_Body(Earth, Bodies'Access), Radius => 5.0, Color => Blue, Distance => 50.0, Angle => 0.0, Speed => 0.02, Turns_Around => Get_Body(Sun, Bodies'Access)); Init_Body (B => Get_Body(Moon, Bodies'Access), Radius => 2.0, Color => Blue, Distance => 15.0, Angle => 0.0, Speed => 0.04, Turns_Around => Get_Body(Earth, Bodies'Access)); Init_Body (B => Get_Body(Satellite, Bodies'Access), Radius => 1.0, Color => Red, Distance => 8.0, Angle => 0.0, Speed => 0.1, Turns_Around => Get_Body(Earth, Bodies'Access)); Init_Body (B => Get_Body(Comet, Bodies'Access), Radius => 1.0, Color => Yellow, Distance => 80.0, Angle => 0.0, Speed => 0.05, Turns_Around => Get_Body(Sun, Bodies'Access)); Init_Body (B => Get_Body(Black_Hole, Bodies'Access), Radius => 0.0, Color => Blue, Distance => 75.0, Angle => 0.0, Speed => -0.02, Turns_Around => Get_Body(Sun, Bodies'Access), Visible => False); Init_Body (B => Get_Body(Asteroid_1, Bodies'Access), Radius => 1.0, Color => Green, Distance => 5.0, Angle => 0.0, Speed => 0.1, Turns_Around => Get_Body(Black_Hole, Bodies'Access)); Init_Body (B => Get_Body(Asteroid_2, Bodies'Access), Radius => 1.0, Color => Yellow, Distance => 5.0, Angle => 3.14, Speed => 0.1, Turns_Around => Get_Body(Black_Hole, Bodies'Access)); -- initialize the Next step time begin the current time (Clock) + the period Next := Clock + Period; --create an infinite loop -- call Move_All procedure -- call Draw_All procedure -- call Swap_Buffers to update the screen -- wait until Next time -- update the Next time while not Is_Killed loop Move_All (Bodies'Access); Draw_All (Bodies, Canvas); Display.Basic.Swap_Buffers(Window); delay until Next; Next := Next + Period; end loop; end Main;
mfkiwl/ewok-kernel-security-OS
Ada
3,430
ads
-- -- Copyright 2018 The wookey project team <[email protected]> -- - Ryad Benadjila -- - Arnauld Michelizza -- - Mathieu Renard -- - Philippe Thierry -- - Philippe Trebuchet -- -- 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 soc.interrupts with spark_mode => on is ------------------------------------- -- STM32F4xx interrupts and events -- ------------------------------------- type t_interrupt is (INT_NONE, -- 0 INT_RESET, INT_NMI, INT_HARDFAULT, INT_MEMMANAGE, INT_BUSFAULT, -- 5 INT_USAGEFAULT, INT_VOID1, INT_VOID2, INT_VOID3, INT_VOID4, -- 10 INT_SVC, INT_DEBUGON, INT_VOID5, INT_PENDSV, INT_SYSTICK, -- 15 INT_WWDG, INT_PVD, INT_TAMP_STAMP, INT_RTC_WKUP, INT_FLASH, -- 20 INT_RCC, INT_EXTI0, INT_EXTI1, INT_EXTI2, INT_EXTI3, -- 25 INT_EXTI4, INT_DMA1_STREAM0, INT_DMA1_STREAM1, INT_DMA1_STREAM2, INT_DMA1_STREAM3, -- 30 INT_DMA1_STREAM4, INT_DMA1_STREAM5, INT_DMA1_STREAM6, INT_ADC, INT_CAN1_TX, -- 35 INT_CAN1_RX0, INT_CAN1_RX1, INT_CAN1_SCE, INT_EXTI9_5, INT_TIM1_BRK_TIM9, -- 40 INT_TIM1_UP_TIM10, INT_TIM1_TRG_COM_TIM11, INT_TIM1_CC, INT_TIM2, INT_TIM3, -- 45 INT_TIM4, INT_I2C1_EV, INT_I2C1_ER, INT_I2C2_EV, INT_I2C2_ER, -- 50 INT_SPI1, INT_SPI2, INT_USART1, INT_USART2, INT_USART3, -- 55 INT_EXTI15_10, INT_RTC_ALARM, INT_OTG_FS_WKUP, INT_TIM8_BRK_TIM12, INT_TIM8_UP_TIM13, -- 60 INT_TIM8_TRG_COM_TIM14, INT_TIM8_CC, INT_DMA1_STREAM7, INT_FSMC, INT_SDIO, -- 65 INT_TIM5, INT_SPI3, INT_UART4, INT_UART5, INT_TIM6_DAC, -- 70 INT_TIM7, INT_DMA2_STREAM0, INT_DMA2_STREAM1, INT_DMA2_STREAM2, INT_DMA2_STREAM3, -- 75 INT_DMA2_STREAM4, INT_ETH, INT_ETH_WKUP, INT_CAN2_TX, INT_CAN2_RX0, -- 80 INT_CAN2_RX1, INT_CAN2_SCE, INT_OTG_FS, INT_DMA2_STREAM5, INT_DMA2_STREAM6, -- 85 INT_DMA2_STREAM7, INT_USART6, INT_I2C3_EV, INT_I2C3_ER, INT_OTG_HS_EP1_OUT, -- 90 INT_OTG_HS_EP1_IN, INT_OTG_HS_WKUP, INT_OTG_HS, INT_DCMI, INT_CRYP, -- 95 INT_HASH_RNG, INT_FPU, INT_UART7, INT_UART8, INT_SPI4, -- 100 INT_SPI5, INT_SPI6, INT_SAI1, INT_LCD_TFT1, INT_LCD_TFT2, -- 105 INT_DMA2D) with size => 8; function get_interrupt return t_interrupt with inline; end soc.interrupts;
likai3g/afmt
Ada
5,473
ads
pragma Ada_2020; with Interfaces; ---- Ada String Format Library ---- @usages: -- -- specified argumnent index -- with Fmt, Fmt.Stdtypes; -- use Fmt, Fmt.Stdtypes; -- ... -- Ada.Text_IO.Put_Line(Format("{1:%H-%M-%S} {2}", FAB & Ada.Calendar.Clock & Message)); -- Ada.Text_IO.Put_Line(Format("bin view of {1:b=10} is {1:b=2}", 123)); -- -- auto argument index -- Ada.Text_IO.Put_Line(Format("{:%H-%M-%S} {} ", FAB & Ada.Calendar.Clock & Message)); -- -- escape character -- Ada.Text_IO.Put_Line(Format("hello, \n, world")); package Fmt is type Argument_Type is interface; -- Argument_Type bind template variant with specified EDIT -- e.g -- Put_Line(Format("{1:w=4,f=0}", To_Argument(123))); -- INDEX : ^ -- EDIT : ^^^^^^^ procedure Parse ( Self : in out Argument_Type; Edit : String) is null; -- Parse "{" [Index] ":" Edit "}" to internal display format settings. -- @param Edit : type related format. e.g. "w=3,b=16" function Get_Length ( Self : in out Argument_Type) return Natural is abstract; -- Compute output string length in bytes. -- @remarks : This function called after `Parse` procedure Put ( Self : in out Argument_Type; Edit : String; To : in out String) is abstract; -- Generate output string -- @param To : target string with length computed by `Get_Length` procedure Finalize (Self : in out Argument_Type) is null; -- this routing call before Format return edited result type Argument_Ptr is access all Argument_Type'Class; type Arguments is array(Positive range <>) of Argument_Ptr; -- Arguments pass to `Format` argument `Values` function "&" (Values : Arguments; New_Item : Argument_Type'Class) return Arguments with Inline; FAB : constant Arguments := []; -- empty Arguments function Format ( Template : String; Values : Arguments := FAB) return String; -- Given Template and Values, output final text -- @param Template : compound by expr and non expr parts -- the expr part wrapped with "{}", contains an optional Value_Index and some optional Edit info -- Value_Index is positive, should compound by dec digits -- if no Value_Index specified, Format will auto increase Value_Index according to Values -- Edit info interpret by the Argument_Type.Parse -- the non expr part can use character '\' to output specific character -- @param Values : values to replace the expr in the Template -- @example: -- Format("x + y = {3:b=16,w=8,f=0}, x = {1}, y = {2}\n", FAB & x & y & (x + y)) function Format ( Template : String; Value : Argument_Type'Class) return String; -- Format one argument with given template generic type Value_Type (<>) is limited private; with function To_Argument (V : Value_Type) return Argument_Type'Class is <>; function Generic_Format ( Template : String; Value : Value_Type) return String; -- Simplified one argument format procedure Parse_KV_Edit ( Edit : String; Conf : not null access procedure(K : String; V : String)); -- Routing for implements `Argument_Type.Parse`. -- Each `key`, `value` pair seperate by delimiter ','. -- The `key` and `value` seperate by '='. subtype Decimal_Digit is Character range '0' .. '9'; subtype Hex_Digit is Character with Static_Predicate => Hex_Digit in '0' .. '9' | 'a' .. 'f' | 'A' .. 'F'; function Is_Decimal_Number (S : String) return Boolean with Inline; subtype Text_Align is Character with Static_Predicate => Text_Align in 'L' | 'M' | 'R'; type Placeholder_Argument_Type is abstract new Argument_Type with record Length : Natural := 0; Default_Edit : access constant String := null; end record; -- Placeholder_Argument_Type bind template variant with specified format -- The Argument value may contains multiparts. -- Each part expressed as placeholder (with prefix %) in the EDIT -- e.g -- Format("{:%Y-%m-%d %H:%M:%S}", To_Argument(Ada.Calendar.Clock)); -- EDIT : ^^^^^^^^^^^^^^^^^ -- ^^ -> placeholder Y -- ^^ -> placeholder m function Is_Valid_Placeholder ( Self : Placeholder_Argument_Type; Name : Character) return Boolean is abstract; -- Given a character, detect whether it is a placeholder function Get_Placeholder_Width ( Self : in out Placeholder_Argument_Type; Name : Character) return Natural is abstract; -- Given a placeholder, tell the edit width procedure Put_Placeholder ( Self : in out Placeholder_Argument_Type; Name : Character; To : in out String) is abstract; -- Replace placeholder with context related text overriding procedure Parse ( Self : in out Placeholder_Argument_Type; Edit : String); -- Note : if Edit is empty then Default_Edit will apply overriding function Get_Length ( Self : in out Placeholder_Argument_Type) return Natural; overriding procedure Put ( Self : in out Placeholder_Argument_Type; Edit : String; To : in out String); ---- Note : if Edit is empty then Default_Edit will apply private function Safe_Abs (X : Long_Long_Integer) return Interfaces.Unsigned_64 with Inline; end Fmt;
persan/A-gst
Ada
21,235
ads
pragma Ada_2005; pragma Style_Checks (Off); pragma Warnings (Off); with Interfaces.C; use Interfaces.C; with glib; with glib.Values; with System; -- with GStreamer.GST_Low_Level.glib_2_0_glib_gquark_h; with GStreamer.GST_Low_Level.gstreamer_0_10_gst_gstminiobject_h; limited with GStreamer.GST_Low_Level.gstreamer_0_10_gst_gststructure_h; with glib; limited with GStreamer.GST_Low_Level.gstreamer_0_10_gst_gstiterator_h; with GStreamer.GST_Low_Level.gstreamer_0_10_gst_gstformat_h; with GLIB; -- with GStreamer.GST_Low_Level.glibconfig_h; with GStreamer.GST_Low_Level.gstreamer_0_10_gst_gstclock_h; with System; package GStreamer.GST_Low_Level.gstreamer_0_10_gst_gstquery_h is -- unsupported macro: GST_TYPE_QUERY (gst_query_get_type()) -- arg-macro: function GST_IS_QUERY (obj) -- return G_TYPE_CHECK_INSTANCE_TYPE ((obj), GST_TYPE_QUERY); -- arg-macro: function GST_IS_QUERY_CLASS (klass) -- return G_TYPE_CHECK_CLASS_TYPE ((klass), GST_TYPE_QUERY); -- arg-macro: function GST_QUERY_GET_CLASS (obj) -- return G_TYPE_INSTANCE_GET_CLASS ((obj), GST_TYPE_QUERY, GstQueryClass); -- arg-macro: function GST_QUERY (obj) -- return G_TYPE_CHECK_INSTANCE_CAST ((obj), GST_TYPE_QUERY, GstQuery); -- arg-macro: function GST_QUERY_CAST (obj) -- return (GstQuery*)(obj); -- arg-macro: function GST_QUERY_CLASS (klass) -- return G_TYPE_CHECK_CLASS_CAST ((klass), GST_TYPE_QUERY, GstQueryClass); -- arg-macro: function GST_QUERY_TYPE (query) -- return ((GstQuery*)(query)).type; -- arg-macro: function GST_QUERY_TYPE_NAME (query) -- return gst_query_type_get_name(GST_QUERY_TYPE(query)); -- arg-macro: procedure gst_query_make_writable (q) -- GST_QUERY_CAST (gst_mini_object_make_writable (GST_MINI_OBJECT_CAST (q))) -- GStreamer -- * Copyright (C) 1999,2000 Erik Walthinsen <[email protected]> -- * 2000 Wim Taymans <[email protected]> -- * 2005 Wim Taymans <[email protected]> -- * -- * gstquery.h: GstQuery API declaration -- * -- * 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. -- --* -- * GstQueryType: -- * @GST_QUERY_NONE: invalid query type -- * @GST_QUERY_POSITION: current position in stream -- * @GST_QUERY_DURATION: total duration of the stream -- * @GST_QUERY_LATENCY: latency of stream -- * @GST_QUERY_JITTER: current jitter of stream -- * @GST_QUERY_RATE: current rate of the stream -- * @GST_QUERY_SEEKING: seeking capabilities -- * @GST_QUERY_SEGMENT: segment start/stop positions -- * @GST_QUERY_CONVERT: convert values between formats -- * @GST_QUERY_FORMATS: query supported formats for convert -- * @GST_QUERY_BUFFERING: query available media for efficient seeking. Since -- * 0.10.20. -- * @GST_QUERY_CUSTOM: a custom application or element defined query. Since -- * 0.10.22. -- * @GST_QUERY_URI: query the URI of the source or sink. Since 0.10.22. -- * -- * Standard predefined Query types -- -- NOTE: don't forget to update the table in gstquery.c when changing -- * this enum -- not in draft-query, necessary? type GstQueryType is (GST_QUERY_NONE, GST_QUERY_POSITION, GST_QUERY_DURATION, GST_QUERY_LATENCY, GST_QUERY_JITTER, GST_QUERY_RATE, GST_QUERY_SEEKING, GST_QUERY_SEGMENT, GST_QUERY_CONVERT, GST_QUERY_FORMATS, GST_QUERY_BUFFERING, GST_QUERY_CUSTOM, GST_QUERY_URI); pragma Convention (C, GstQueryType); -- gst/gstquery.h:73 --* -- * GstBufferingMode: -- * @GST_BUFFERING_STREAM: a small amount of data is buffered -- * @GST_BUFFERING_DOWNLOAD: the stream is being downloaded -- * @GST_BUFFERING_TIMESHIFT: the stream is being downloaded in a ringbuffer -- * @GST_BUFFERING_LIVE: the stream is a live stream -- * -- * The different types of buffering methods. -- type GstBufferingMode is (GST_BUFFERING_STREAM, GST_BUFFERING_DOWNLOAD, GST_BUFFERING_TIMESHIFT, GST_BUFFERING_LIVE); pragma Convention (C, GstBufferingMode); -- gst/gstquery.h:89 type GstQueryTypeDefinition; --subtype GstQueryTypeDefinition is u_GstQueryTypeDefinition; -- gst/gstquery.h:91 type GstQuery; --subtype GstQuery is u_GstQuery; -- gst/gstquery.h:92 type GstQueryClass; type u_GstQueryClass_u_gst_reserved_array is array (0 .. 3) of System.Address; --subtype GstQueryClass is u_GstQueryClass; -- gst/gstquery.h:93 --* -- * GstQueryTypeDefinition: -- * @value: the unique id of the Query type -- * @nick: a short nick -- * @description: a longer description of the query type -- * @quark: the quark for the nick -- * -- * A Query Type definition -- type GstQueryTypeDefinition is record value : aliased GstQueryType; -- gst/gstquery.h:106 nick : access GLIB.gchar; -- gst/gstquery.h:107 description : access GLIB.gchar; -- gst/gstquery.h:108 quark : aliased Glib.GQuark; -- gst/gstquery.h:109 end record; pragma Convention (C_Pass_By_Copy, GstQueryTypeDefinition); -- gst/gstquery.h:104 --* -- * GST_QUERY_TYPE: -- * @query: the query to query -- * -- * Get the #GstQueryType of the query. -- --* -- * GST_QUERY_TYPE_NAME: -- * @query: the query to query -- * -- * Get a constant string representation of the #GstQueryType of the query. -- * -- * Since: 0.10.4 -- --* -- * GstQuery: -- * @mini_object: The parent #GstMiniObject type -- * @type: the #GstQueryType -- * @structure: the #GstStructure containing the query details. -- * -- * The #GstQuery structure. -- type GstQuery is record mini_object : aliased GStreamer.GST_Low_Level.gstreamer_0_10_gst_gstminiobject_h.GstMiniObject; -- gst/gstquery.h:150 c_type : aliased GstQueryType; -- gst/gstquery.h:153 structure : access GStreamer.GST_Low_Level.gstreamer_0_10_gst_gststructure_h.GstStructure; -- gst/gstquery.h:155 u_gst_reserved : System.Address; -- gst/gstquery.h:158 end record; pragma Convention (C_Pass_By_Copy, GstQuery); -- gst/gstquery.h:148 --< public > -- with COW --< private > type GstQueryClass is record mini_object_class : aliased GStreamer.GST_Low_Level.gstreamer_0_10_gst_gstminiobject_h.GstMiniObjectClass; -- gst/gstquery.h:162 u_gst_reserved : u_GstQueryClass_u_gst_reserved_array; -- gst/gstquery.h:165 end record; pragma Convention (C_Pass_By_Copy, GstQueryClass); -- gst/gstquery.h:161 --< private > function gst_query_type_get_name (query : GstQueryType) return access GLIB.gchar; -- gst/gstquery.h:168 pragma Import (C, gst_query_type_get_name, "gst_query_type_get_name"); function gst_query_type_to_quark (query : GstQueryType) return Glib.GQuark; -- gst/gstquery.h:169 pragma Import (C, gst_query_type_to_quark, "gst_query_type_to_quark"); function gst_query_get_type return GLIB.GType; -- gst/gstquery.h:171 pragma Import (C, gst_query_get_type, "gst_query_get_type"); -- register a new query function gst_query_type_register (nick : access GLIB.gchar; description : access GLIB.gchar) return GstQueryType; -- gst/gstquery.h:174 pragma Import (C, gst_query_type_register, "gst_query_type_register"); function gst_query_type_get_by_nick (nick : access GLIB.gchar) return GstQueryType; -- gst/gstquery.h:176 pragma Import (C, gst_query_type_get_by_nick, "gst_query_type_get_by_nick"); -- check if a query is in an array of querys function gst_query_types_contains (types : access GstQueryType; c_type : GstQueryType) return GLIB.gboolean; -- gst/gstquery.h:179 pragma Import (C, gst_query_types_contains, "gst_query_types_contains"); -- query for query details function gst_query_type_get_details (c_type : GstQueryType) return access constant GstQueryTypeDefinition; -- gst/gstquery.h:185 pragma Import (C, gst_query_type_get_details, "gst_query_type_get_details"); function gst_query_type_iterate_definitions return access GStreamer.GST_Low_Level.gstreamer_0_10_gst_gstiterator_h.GstIterator; -- gst/gstquery.h:186 pragma Import (C, gst_query_type_iterate_definitions, "gst_query_type_iterate_definitions"); -- refcounting --* -- * gst_query_ref: -- * @q: a #GstQuery to increase the refcount of. -- * -- * Increases the refcount of the given query by one. -- * -- * Returns: @q -- function gst_query_ref (q : access GstQuery) return access GstQuery; -- gst/gstquery.h:202 pragma Import (C, gst_query_ref, "gst_query_ref"); --* -- * gst_query_unref: -- * @q: a #GstQuery to decrease the refcount of. -- * -- * Decreases the refcount of the query. If the refcount reaches 0, the query -- * will be freed. -- procedure gst_query_unref (q : access GstQuery); -- gst/gstquery.h:219 pragma Import (C, gst_query_unref, "gst_query_unref"); -- copy query --* -- * gst_query_copy: -- * @q: a #GstQuery to copy. -- * -- * Copies the given query using the copy function of the parent #GstStructure. -- * -- * Free-function: gst_query_unref -- * -- * Returns: (transfer full): a new copy of @q. -- function gst_query_copy (q : access constant GstQuery) return access GstQuery; -- gst/gstquery.h:240 pragma Import (C, gst_query_copy, "gst_query_copy"); --* -- * gst_query_make_writable: -- * @q: (transfer full): a #GstQuery to make writable -- * -- * Makes a writable query from the given query. -- * -- * Returns: (transfer full): a new writable query (possibly same as @q) -- -- position query function gst_query_new_position (format : GStreamer.GST_Low_Level.gstreamer_0_10_gst_gstformat_h.GstFormat) return access GstQuery; -- gst/gstquery.h:256 pragma Import (C, gst_query_new_position, "gst_query_new_position"); procedure gst_query_set_position (query : access GstQuery; format : GStreamer.GST_Low_Level.gstreamer_0_10_gst_gstformat_h.GstFormat; cur : GLIB.gint64); -- gst/gstquery.h:257 pragma Import (C, gst_query_set_position, "gst_query_set_position"); procedure gst_query_parse_position (query : access GstQuery; format : access GStreamer.GST_Low_Level.gstreamer_0_10_gst_gstformat_h.GstFormat; cur : access GLIB.gint64); -- gst/gstquery.h:258 pragma Import (C, gst_query_parse_position, "gst_query_parse_position"); -- duration query function gst_query_new_duration (format : GStreamer.GST_Low_Level.gstreamer_0_10_gst_gstformat_h.GstFormat) return access GstQuery; -- gst/gstquery.h:261 pragma Import (C, gst_query_new_duration, "gst_query_new_duration"); procedure gst_query_set_duration (query : access GstQuery; format : GStreamer.GST_Low_Level.gstreamer_0_10_gst_gstformat_h.GstFormat; duration : GLIB.gint64); -- gst/gstquery.h:262 pragma Import (C, gst_query_set_duration, "gst_query_set_duration"); procedure gst_query_parse_duration (query : access GstQuery; format : access GStreamer.GST_Low_Level.gstreamer_0_10_gst_gstformat_h.GstFormat; duration : access GLIB.gint64); -- gst/gstquery.h:263 pragma Import (C, gst_query_parse_duration, "gst_query_parse_duration"); -- latency query function gst_query_new_latency return access GstQuery; -- gst/gstquery.h:266 pragma Import (C, gst_query_new_latency, "gst_query_new_latency"); procedure gst_query_set_latency (query : access GstQuery; live : GLIB.gboolean; min_latency : GStreamer.GST_Low_Level.gstreamer_0_10_gst_gstclock_h.GstClockTime; max_latency : GStreamer.GST_Low_Level.gstreamer_0_10_gst_gstclock_h.GstClockTime); -- gst/gstquery.h:267 pragma Import (C, gst_query_set_latency, "gst_query_set_latency"); procedure gst_query_parse_latency (query : access GstQuery; live : access GLIB.gboolean; min_latency : access GStreamer.GST_Low_Level.gstreamer_0_10_gst_gstclock_h.GstClockTime; max_latency : access GStreamer.GST_Low_Level.gstreamer_0_10_gst_gstclock_h.GstClockTime); -- gst/gstquery.h:269 pragma Import (C, gst_query_parse_latency, "gst_query_parse_latency"); -- convert query function gst_query_new_convert (src_format : GStreamer.GST_Low_Level.gstreamer_0_10_gst_gstformat_h.GstFormat; value : GLIB.gint64; dest_format : GStreamer.GST_Low_Level.gstreamer_0_10_gst_gstformat_h.GstFormat) return access GstQuery; -- gst/gstquery.h:273 pragma Import (C, gst_query_new_convert, "gst_query_new_convert"); procedure gst_query_set_convert (query : access GstQuery; src_format : GStreamer.GST_Low_Level.gstreamer_0_10_gst_gstformat_h.GstFormat; src_value : GLIB.gint64; dest_format : GStreamer.GST_Low_Level.gstreamer_0_10_gst_gstformat_h.GstFormat; dest_value : GLIB.gint64); -- gst/gstquery.h:274 pragma Import (C, gst_query_set_convert, "gst_query_set_convert"); procedure gst_query_parse_convert (query : access GstQuery; src_format : access GStreamer.GST_Low_Level.gstreamer_0_10_gst_gstformat_h.GstFormat; src_value : access GLIB.gint64; dest_format : access GStreamer.GST_Low_Level.gstreamer_0_10_gst_gstformat_h.GstFormat; dest_value : access GLIB.gint64); -- gst/gstquery.h:276 pragma Import (C, gst_query_parse_convert, "gst_query_parse_convert"); -- segment query function gst_query_new_segment (format : GStreamer.GST_Low_Level.gstreamer_0_10_gst_gstformat_h.GstFormat) return access GstQuery; -- gst/gstquery.h:279 pragma Import (C, gst_query_new_segment, "gst_query_new_segment"); procedure gst_query_set_segment (query : access GstQuery; rate : GLIB.gdouble; format : GStreamer.GST_Low_Level.gstreamer_0_10_gst_gstformat_h.GstFormat; start_value : GLIB.gint64; stop_value : GLIB.gint64); -- gst/gstquery.h:280 pragma Import (C, gst_query_set_segment, "gst_query_set_segment"); procedure gst_query_parse_segment (query : access GstQuery; rate : access GLIB.gdouble; format : access GStreamer.GST_Low_Level.gstreamer_0_10_gst_gstformat_h.GstFormat; start_value : access GLIB.gint64; stop_value : access GLIB.gint64); -- gst/gstquery.h:282 pragma Import (C, gst_query_parse_segment, "gst_query_parse_segment"); -- application specific query function gst_query_new_application (c_type : GstQueryType; structure : access GStreamer.GST_Low_Level.gstreamer_0_10_gst_gststructure_h.GstStructure) return access GstQuery; -- gst/gstquery.h:286 pragma Import (C, gst_query_new_application, "gst_query_new_application"); function gst_query_get_structure (query : access GstQuery) return access GStreamer.GST_Low_Level.gstreamer_0_10_gst_gststructure_h.GstStructure; -- gst/gstquery.h:288 pragma Import (C, gst_query_get_structure, "gst_query_get_structure"); -- seeking query function gst_query_new_seeking (format : GStreamer.GST_Low_Level.gstreamer_0_10_gst_gstformat_h.GstFormat) return access GstQuery; -- gst/gstquery.h:291 pragma Import (C, gst_query_new_seeking, "gst_query_new_seeking"); procedure gst_query_set_seeking (query : access GstQuery; format : GStreamer.GST_Low_Level.gstreamer_0_10_gst_gstformat_h.GstFormat; seekable : GLIB.gboolean; segment_start : GLIB.gint64; segment_end : GLIB.gint64); -- gst/gstquery.h:292 pragma Import (C, gst_query_set_seeking, "gst_query_set_seeking"); procedure gst_query_parse_seeking (query : access GstQuery; format : access GStreamer.GST_Low_Level.gstreamer_0_10_gst_gstformat_h.GstFormat; seekable : access GLIB.gboolean; segment_start : access GLIB.gint64; segment_end : access GLIB.gint64); -- gst/gstquery.h:296 pragma Import (C, gst_query_parse_seeking, "gst_query_parse_seeking"); -- formats query function gst_query_new_formats return access GstQuery; -- gst/gstquery.h:301 pragma Import (C, gst_query_new_formats, "gst_query_new_formats"); procedure gst_query_set_formats (query : access GstQuery; n_formats : GLIB.gint -- , ... ); -- gst/gstquery.h:302 pragma Import (C, gst_query_set_formats, "gst_query_set_formats"); procedure gst_query_set_formatsv (query : access GstQuery; n_formats : GLIB.gint; formats : access GStreamer.GST_Low_Level.gstreamer_0_10_gst_gstformat_h.GstFormat); -- gst/gstquery.h:303 pragma Import (C, gst_query_set_formatsv, "gst_query_set_formatsv"); procedure gst_query_parse_formats_length (query : access GstQuery; n_formats : access GLIB.guint); -- gst/gstquery.h:304 pragma Import (C, gst_query_parse_formats_length, "gst_query_parse_formats_length"); procedure gst_query_parse_formats_nth (query : access GstQuery; nth : GLIB.guint; format : access GStreamer.GST_Low_Level.gstreamer_0_10_gst_gstformat_h.GstFormat); -- gst/gstquery.h:305 pragma Import (C, gst_query_parse_formats_nth, "gst_query_parse_formats_nth"); -- buffering query function gst_query_new_buffering (format : GStreamer.GST_Low_Level.gstreamer_0_10_gst_gstformat_h.GstFormat) return access GstQuery; -- gst/gstquery.h:308 pragma Import (C, gst_query_new_buffering, "gst_query_new_buffering"); procedure gst_query_set_buffering_percent (query : access GstQuery; busy : GLIB.gboolean; percent : GLIB.gint); -- gst/gstquery.h:309 pragma Import (C, gst_query_set_buffering_percent, "gst_query_set_buffering_percent"); procedure gst_query_parse_buffering_percent (query : access GstQuery; busy : access GLIB.gboolean; percent : access GLIB.gint); -- gst/gstquery.h:310 pragma Import (C, gst_query_parse_buffering_percent, "gst_query_parse_buffering_percent"); procedure gst_query_set_buffering_stats (query : access GstQuery; mode : GstBufferingMode; avg_in : GLIB.gint; avg_out : GLIB.gint; buffering_left : GLIB.gint64); -- gst/gstquery.h:312 pragma Import (C, gst_query_set_buffering_stats, "gst_query_set_buffering_stats"); procedure gst_query_parse_buffering_stats (query : access GstQuery; mode : access GstBufferingMode; avg_in : access GLIB.gint; avg_out : access GLIB.gint; buffering_left : access GLIB.gint64); -- gst/gstquery.h:315 pragma Import (C, gst_query_parse_buffering_stats, "gst_query_parse_buffering_stats"); procedure gst_query_set_buffering_range (query : access GstQuery; format : GStreamer.GST_Low_Level.gstreamer_0_10_gst_gstformat_h.GstFormat; start : GLIB.gint64; stop : GLIB.gint64; estimated_total : GLIB.gint64); -- gst/gstquery.h:319 pragma Import (C, gst_query_set_buffering_range, "gst_query_set_buffering_range"); procedure gst_query_parse_buffering_range (query : access GstQuery; format : access GStreamer.GST_Low_Level.gstreamer_0_10_gst_gstformat_h.GstFormat; start : access GLIB.gint64; stop : access GLIB.gint64; estimated_total : access GLIB.gint64); -- gst/gstquery.h:322 pragma Import (C, gst_query_parse_buffering_range, "gst_query_parse_buffering_range"); function gst_query_add_buffering_range (query : access GstQuery; start : GLIB.gint64; stop : GLIB.gint64) return GLIB.gboolean; -- gst/gstquery.h:325 pragma Import (C, gst_query_add_buffering_range, "gst_query_add_buffering_range"); function gst_query_get_n_buffering_ranges (query : access GstQuery) return GLIB.guint; -- gst/gstquery.h:328 pragma Import (C, gst_query_get_n_buffering_ranges, "gst_query_get_n_buffering_ranges"); function gst_query_parse_nth_buffering_range (query : access GstQuery; index : GLIB.guint; start : access GLIB.gint64; stop : access GLIB.gint64) return GLIB.gboolean; -- gst/gstquery.h:330 pragma Import (C, gst_query_parse_nth_buffering_range, "gst_query_parse_nth_buffering_range"); -- URI query function gst_query_new_uri return access GstQuery; -- gst/gstquery.h:335 pragma Import (C, gst_query_new_uri, "gst_query_new_uri"); procedure gst_query_parse_uri (query : access GstQuery; uri : System.Address); -- gst/gstquery.h:336 pragma Import (C, gst_query_parse_uri, "gst_query_parse_uri"); procedure gst_query_set_uri (query : access GstQuery; uri : access GLIB.gchar); -- gst/gstquery.h:337 pragma Import (C, gst_query_set_uri, "gst_query_set_uri"); end GStreamer.GST_Low_Level.gstreamer_0_10_gst_gstquery_h;
BrickBot/Bound-T-H8-300
Ada
59,591
adb
-- HRT.Skeleton (body) -- -- A component of the Bound-T Worst-Case Execution Time Tool. -- ------------------------------------------------------------------------------- -- Copyright (c) 1999 .. 2015 Tidorum Ltd -- 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 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. -- -- 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. -- -- Other modules (files) of this software composition should contain their -- own copyright statements, which may have different copyright and usage -- conditions. The above conditions apply to this file. ------------------------------------------------------------------------------- -- -- $Revision: 1.17 $ -- $Date: 2015/10/24 20:05:49 $ -- -- $Log: hrt-skeleton.adb,v $ -- Revision 1.17 2015/10/24 20:05:49 niklas -- Moved to free licence. -- -- Revision 1.16 2008-12-25 08:32:42 niklas -- Removed unused context clauses and local variables. -- -- Revision 1.15 2005/08/24 10:14:26 niklas -- Replaced the local function Get_Call_Nodes with the new -- inquiry function Programs.Nodes (Call_List). -- -- Revision 1.14 2005/04/17 07:54:58 niklas -- Changed Output.Error to Output.Fault in Unique_Edge. -- -- Revision 1.13 2005/02/16 21:11:46 niklas -- BT-CH-0002. -- -- Revision 1.12 2004/05/01 10:38:49 niklas -- First Tidorum version. -- Updated (incompletely) to use separate Node_Times and Edge_Times. -- Updated for changes in Programs.Execution and Analyser. -- -- Revision 1.11 2003/03/11 08:23:57 holsti -- Split execution-bounds stuff from the Programs package to -- make the child package Programs.Execution. -- -- Revision 1.10 2001/12/10 15:18:17 holsti -- The Generate operation takes an assertion-set as parameter. -- -- Revision 1.9 2001/06/19 21:41:50 holsti -- HRT.Comments to ESF, not standard output. -- -- Revision 1.8 2001/05/20 13:26:10 holsti -- Use Flow.Count_Memory_Traffic (NC_120, NC_121, NC_122, NC_128). -- -- Revision 1.7 2001/04/06 11:10:44 ville -- NC_054 fixed -- -- Revision 1.6 2001/04/05 10:48:42 ville -- Deleted obsolete subroutines, variables etc -- -- Revision 1.5 2001/04/04 13:27:48 ville -- ESF file produced -- -- Revision 1.4 2001/04/03 10:32:05 ville -- ESF output in standard output -- -- Revision 1.3 2001/03/20 13:37:54 ville -- Memory reads and writes added to CCS -- -- Revision 1.2 2001/03/19 12:36:14 ville -- HRT rework third phase WCP converted to ESL lines -- -- Revision 1.1 2001/03/14 14:50:58 ville -- HRT rework second phase: skeleton package splitted -- -- Revision 1.10 2001/03/13 12:43:47 ville -- HRT rework first phase: WCP for a call -- -- Revision 1.9 2001/02/19 09:38:14 holsti -- Adapted to changes in Programs.Execution_Bounds_Ref. -- -- Revision 1.8 2001/01/02 07:46:18 langback -- Minor change to one Error message. -- -- Revision 1.7 2000/12/28 12:35:36 holsti -- Adapted to changes in Programs.Identify. -- -- Revision 1.6 2000/11/29 14:10:28 saarinen -- Cleaned procedure Get_TPOF. -- -- Revision 1.5 2000/11/22 22:29:04 holsti -- Using Processor.Code_Address_T instead of Processor.Address_T. -- -- Revision 1.4 2000/09/08 13:17:13 saarinen -- Made some minor corrections. -- -- Revision 1.3 2000/08/18 18:09:01 holsti -- Unbounded_Vectors Index_Type removed. -- -- Revision 1.2 2000/08/11 12:54:33 saarinen -- First implementation. -- with Ada.Text_IO; with Analyser; with Assertions; with ESF; with Flow; with Flow.Execution; with HRT.TPOF; with Loops; with Output; with Processor; package body HRT.Skeleton is -- INTERNAL TYPES: type CCS_T is record Time : Processor.Time_T; Reads : Natural; Writes : Natural; end record; -- The wcet effort including: -- Time, processing time -- Reads, memory reads -- Writes, memory reads type Loop_Fraction_T is record Numerator : Positive; Denominator : Positive; end record; -- Indicates the fraction of node counts that are -- used in each segment of an unrolled loop: -- "First" segment (containing nodes from loop head to exit) -- gets faction of 1 / Loop Repeats, -- "Second" segment (containing nodes from node following -- loop exit to source of loop repeat edge) gets fraction -- of 1 / 1. -- "Third" segment (containing again nodes from loop head -- to exit) gets fraction of (Loop Repeats - 1) / Loop Repeats. function "*" (Left : Integer; Right : Loop_Fraction_T) return Integer is begin if Left mod Right.Denominator > 0 then -- The "Left" parameter is not multiple of denominator -- of the "Right" parameter as it should be. Output.Fault ( Location => "Multiplication of an integer by a fraction", Text => "Integer is not multiple of the denominator of " & "the fraction (" & Integer'image(Left) & " mod" & Positive'image(Right.Denominator) & " > 0)"); raise Internal_Error; end if; return (Left / Right.Denominator) * Right.Numerator; end "*"; function "*" (Left : Loop_Fraction_T; Right : Loop_Fraction_T) return Loop_Fraction_T is begin return (Numerator => Left.Numerator * Right.Numerator, Denominator => Left.Denominator * Right.Denominator); end "*"; function "/" (Left : Integer; Right : Integer) return Loop_Fraction_T is begin return (Numerator => Left, Denominator => Right); end "/"; type Edge_Set_T is array (Flow.Edge_Index_T range <>) of Boolean; -- Worst Case Path (WCP) definitions: type WCP_Node_Kind_T is ( Real_Node, Loop_Head, Loop_Exit); -- Different types of WCP nodes: -- Real_Node, corresponds to some real node of the flow graph -- of a subprogram. -- Loop_Head, corresponds to the head of some loop in the -- flow graph of a subprogram. -- Loop_Exit, corresponds to the exit of some loop in the -- flow graph of a subprogram. type WCP_Node_T(Kind : WCP_Node_Kind_T := Real_Node) is record case Kind is when Real_Node => Node : Flow.Node_T; Count : Positive; when Loop_Head => Repeats : Positive; when Loop_Exit => null; end case; end record; -- One node in the WCP: -- Kind, indicates type of the node (see WCP_Node_Kind_T). -- Node, reference to flow graph node for "Real Node" kind of -- WCP node. -- Count, execution count of a "Real Node". -- Repeats, loop repeats for a "Loop Head". type WCP_Table_T is array (Positive range <>) of WCP_Node_T; -- Array for WCP nodes. The length of the array depends -- on the number nodes and nested loops in the flow graph -- of a subprogram (see "Longest_Unrolled_Path). type WCP_T(Max_Length : Positive) is record Length : Natural := 0; Element : WCP_Table_T(1 .. Max_Length); end record; -- Record for WCP: -- Max_Length, maximum length of WCP array (see WCP_Table_T) -- Length, number of used WCP nodes -- Element, WCP nodes (see WCP_Table_T) -- INTERNAL DATA: -- None -- INTERNAL OPERATIONS: function Unique_Edge ( What : String; From : Flow.Edge_List_T; Where : Edge_Set_T) return Flow.Edge_T -- Returnes unique edge from given edge list fullfilling the -- given criteria. is Found : Boolean := False; Edge : Flow.Edge_T; begin for F in From'range loop if Where(Flow.Index(From(F))) then if Found then -- If more than one edges are found, -- there are illegal branches. Output.Error ( Text => "Unique edge expected, but second edge found (" & Flow.Edge_Index_T'image(Flow.Index(From(F))) & " after" & Flow.Edge_Index_T'image(Flow.Index(Edge)) & " )"); raise Path_Branch; else Edge := From(F); Found := True; end if; end if; end loop; if not Found then -- If requested edge was not found, the path is -- somehow broken. Output.Fault ( Location => "HRT.Skeleton.Unique_Edge", Text => "Unique " & What & " edge searched, but none found."); raise Path_Broken; end if; return Edge; end Unique_Edge; function Longest_Unrolled_Path ( Graph : Flow.Graph_T; Luups : Loops.Loops_T) return Positive -- -- An upper bound on the length of a linear path through the -- flow-graph, after the loops have been partially unrolled -- into the bottom-exit form. -- -- The result is only an upper bound, because it does not -- consider the actual path taken, and it assumes conservatively -- that any loop can be doubled in unrolling, without looking at -- how the "middle-exit" point divides up the loop. -- is Full_Path : Natural := 0; -- The number of nodes in the full path, with all loops -- unrolled. Loop_Path : array (Luups'Range) of Natural := (others => 0); -- The number of nodes in the path for each loop, with -- inner loops unrolled. Counted : Flow.Node_Set_T (1 .. Flow.Max_Node (Graph)) := (others => False); -- -- The nodes that have been counted (included in the potential -- path length). Each node is counted once, but may be included -- multiple times on the path due to loop unrolling. procedure Count_Loop ( Index : Loops.Loop_Index_T; Members : Flow.Node_List_T; Parent : Loops.Loop_List_T) -- -- Compute the path length for a given loop, assuming that -- the contribution from inner loops is already in Loop_Path -- for this loop. -- is Mem_Index : Flow.Node_Index_T; -- The index of a loop member node. Unrolled_Path : Natural; -- The length of this loop when partly unrolled. Parent_Index : Loops.Loop_Index_T; -- The index of the parent loop, if there is one. begin -- Count the loop-members that have not been counted in -- inner loops: for M in Members'Range loop Mem_Index := Flow.Index (Members(M)); if not Counted(Mem_Index) then -- This node occurs once in the path through this loop. Loop_Path(Index) := Loop_Path(Index) + 1; Counted(Mem_Index) := True; end if; end loop; -- Count this loop in the path through its parent loop -- (or through the graph, if there is no parent loop). -- Through unrolling, the loop can be doubled. Unrolled_Path := 2 * Loop_Path(Index) + 1; if Parent'Length > 0 then -- There is an outer loop, so this loop contributes -- to the path through the outer loop. Parent_Index := Loops.Loop_Index (Parent(Parent'First)); Loop_Path(Parent_Index) := Loop_Path(Parent_Index) + Unrolled_Path; else -- There is no outer loop. This loop contributes -- directly to the full path. Full_Path := Full_Path + Unrolled_Path; end if; end Count_Loop; begin -- Scan the loops from innermost to outermost: for L in Luups'Range loop Count_Loop ( Index => L, Members => Flow.To_List ( Set => Loops.Members (Luups(L)).all, From => Graph), Parent => Loops.Containing_Loop ( Loops => Luups, Luup => Luups(L)) ); end loop; -- Count the nodes that are in no loop: for C in Counted'Range loop if not Counted(C) then Full_Path := Full_Path + 1; -- Should also set Counted(C) := True, in principle. end if; end loop; return Full_Path; end Longest_Unrolled_Path; procedure Convert_WCP_To_ESL ( WCP : in WCP_T; HRT : in HRT_Struct_T; Interacting : in Programs.Subprogram_Set_T; Bounds : in Programs.Execution.Bounds_Ref; Calls : in Programs.Call_List_T; Call_Nodes : in Flow.Node_List_T; Called : in out Entry_Set_T; CCS : in out CCS_T; Column : in out Positive); -- Converts given WCP to Execution Skeleton Lines using given -- HRT sreucture, set of interacting subprograms, subroutine -- calls and nodes containing the calls. -- The execution bounds is needed only for a parameter for -- possibly called procedure "Add_Call_To_ESL" (see below). -- The set of called PO Entries is updated when a some node -- in the WCP contains call to some PO Entry. -- The CCS is updated with the effort of the nodes. -- The column is updated when a loop head or a loop exit -- is found. procedure Add_Call_To_ESL ( Call : in Programs.Call_T; Bounds : in Programs.Execution.Bounds_Ref; HRT : in HRT_Struct_T; Interacting : in Programs.Subprogram_Set_T; Called : in out Entry_Set_T; CCS : in out CCS_T; Column : in out Positive); -- The Execution Skeleton Lines of the given call are added -- to the ESF file using given execution bounds. The rest of -- the parameters are needed for a parameters of procedure -- "Convert_WCP_To_ESL" (see above) which is called by this -- procedure. procedure Build_HRT_Skeletons ( HRT : in out HRT_Struct_T; Program : in Programs.Program_T; Bounds_Set : in Programs.Execution.Bounds_Set_T; File_Name : in String); procedure Build_Skeleton ( Call : in Programs.Call_T; HRT : in HRT_Struct_T; Interacting : in Programs.Subprogram_Set_T; Own_Entries : in Entry_Set_T; Bounds_Set : in Programs.Execution.Bounds_Set_T); procedure List_Execution_Statements ( Call : in Programs.Call_T; Bounds : in Programs.Execution.Bounds_Ref; HRT : in HRT_Struct_T; Interacting : in Programs.Subprogram_Set_T; Called : out Entry_Set_t); -- using : -- A root call (with completed WCET analysis), -- execution bounds, -- HRT structure, -- interacting subprograms, -- giving: -- execution statement list into the ESF file, -- set of called PO Entires -- OPERATION IMPLEMENTATIONS: procedure Put_ESL ( Line : in String; Column : in Positive) -- Insert the given line to the Execution Statement List -- intended according to the given column. is begin Ada.Text_IO.Set_Col ( File => ESF.File, To => Ada.Text_IO.Positive_Count(Column)); Ada.Text_IO.Put_Line ( File => ESF.File, Item => Line); end Put_ESL; procedure Convert_WCP_To_ESL ( WCP : in WCP_T; HRT : in HRT_Struct_T; Interacting : in Programs.Subprogram_Set_T; Bounds : in Programs.Execution.Bounds_Ref; Calls : in Programs.Call_List_T; Call_Nodes : in Flow.Node_List_T; Called : in out Entry_Set_T; CCS : in out CCS_T; Column : in out Positive) -- Converts given WCP to Execution Skeleton Lines using given -- HRT structure, set of interacting subprograms, subroutine -- calls and nodes containing the calls. -- -- The set of called PO Entries is updated when a some node -- in the WCP contains call to some PO Entry. -- The CCS is updated with the effort of the nodes. -- The column is updated when a loop head or a loop exit -- is found. is use type Processor.Time_T; Node_Times : constant Programs.Execution.Node_Times_T := Programs.Execution.Node_Times ( From => Bounds, With_Calls => True); Edge_Times : constant Programs.Execution.Edge_Times_T := Programs.Execution.Edge_Times (Bounds); procedure Add_Time (Node : in Flow.Node_T) -- -- Adds node effort to CCS. -- is Index : constant Flow.Node_Index_T := Flow.Index (Node); -- The index of the node. Reads, Writes : Natural; -- The number of reads and writes in the node. begin Flow.Execution.Count_Memory_Traffic ( From => Node, Reads => Reads, Writes => Writes); CCS.Time := CCS.Time + Node_Times(Index); -- Add processing time. CCS.Reads := CCS.Reads + Reads; -- Add memory reads. CCS.Writes := CCS.Writes + Writes; -- Add memory writes. end Add_Time; procedure Check_Node ( Node : in Flow.Node_T; Exec_Count : in Positive) -- -- Checks node for calls and adds node effort to ccs. -- is use type Flow.Node_T; PO_Entry : Entry_T; begin for N in Call_Nodes'Range loop if Node = Call_Nodes(N) then -- Call found. declare Call : Programs.Call_T := Calls(N); Call_Bounds : Programs.Execution.Bounds_Ref := Programs.Execution.Call_Bounds ( On => Call, Within => Bounds); Callee : Programs.Subprogram_T := Programs.Callee(Call); begin if Is_Member(Callee, HRT.PO_Entries) then -- PO_Entry call. if CCS.Time > 0 then Put_ESL ( Line => "wcet" & Processor.Time_T'image (CCS.Time) & " ," & Natural'image(CCS.Reads) & " ," & Natural'image(CCS.Writes), Column => Column); end if; PO_Entry := Search ( Sub => Callee, Of_Set => HRT.PO_Entries); -- Search the PO_Entry which is the same as the -- called subprogram. case PO_Entry.Def.Kind is when Resource => Put_ESL ( Line => "call_po " & PO_Entry.Def.Res_Name.all & " " & Programs.Name (Callee), Column => Column); when Synchro => Put_ESL ( Line => "call_po " & PO_Entry.Def.Sync_Name.all & " " & Programs.Name (Callee), Column => Column); when Thread => null; -- impossible end case; Add (To => Called, Adding => PO_Entry); -- Add the entry to set of called PO entries. elsif Programs.Is_Member(Callee, Interacting) then -- Call to interacting subprogram. Add_Call_To_ESL ( Call => Call, Bounds => Call_Bounds, HRT => HRT, Interacting => Interacting, Called => Called, CCS => CCS, Column => Column); -- Recursively include the execute statements -- of the callee. else Add_Time(Node); -- Other call, add node time including execution -- time of the call. end if; end; return; end if; end loop; -- No call => add only the node time. Add_Time(Node); end Check_Node; begin for N in 1 .. WCP.Length loop -- Process all WCP nodes. case WCP.Element(N).Kind is when Real_Node => -- Real Node: this corresponds to some real -- flow graph node. Check_Node ( Node => WCP.Element(N).Node, Exec_Count => WCP.Element(N).Count); -- Check the effect of the flow graph node. when Loop_Head => -- This corresponds to a head of some loop. if CCS.Time > 0 then Put_ESL ( Line => "wcet" & Processor.Time_T'image (CCS.Time) & " ," & Natural'image(CCS.Reads) & " ," & Natural'image(CCS.Writes), Column => Column); CCS := (0,0,0); end if; Put_ESL ( Line => "loop" & Positive'image(WCP.Element(N).Repeats), Column => Column); -- Mark the loop head into the ESF file. Column := Column + 2; -- Increment the indention. when Loop_Exit => -- This corresponds to end of some loop. if CCS.Time > 0 then Put_ESL ( Line => "wcet" & Processor.Time_T'image (CCS.Time) & " ," & Natural'image(CCS.Reads) & " ," & Natural'image(CCS.Writes), Column => Column); CCS := (0,0,0); end if; Column := Column - 2; -- Decrement the indention. Put_ESL ( Line => "end", Column => Column); -- Mark the end of the loop into the ESF file. end case; end loop; end Convert_WCP_To_ESL; procedure Add_WCP_Node ( Node : in WCP_Node_T; WCP : in out WCP_T) -- Add the given node to the given WCP node list. is begin if WCP.Length < WCP.Element'Last then -- There is still room for new WCP nodes. WCP.Length := WCP.Length + 1; WCP.Element (WCP.Length) := Node; if Trace then -- Trace option is selected: WCP information -- is requested. case Node.Kind is when Real_Node => Output.Note (Text => "WCP node " & Positive'image(WCP.Length) & " : Real Node " & Flow.Node_Index_T'image(Flow.Index(Node.Node)) & ", Execution count " & Positive'image(Node.Count)); when Loop_Head => Output.Note (Text => "WCP node " & Positive'image(WCP.Length) & " : Loop Head, Repeats " & Positive'image(Node.Repeats)); when Loop_Exit => Output.Note (Text => "WCP node " & Positive'image(WCP.Length) & " : Loop Exit"); end case; end if; else -- WCP list is full. Output.Fault ( Location => "Add_WCP_Node", Text => "WCP index overflow (" & Positive'image(WCP.Length + 1) & " >" & Positive'image(WCP.Element'Last) & ")"); raise Internal_Error; end if; end Add_WCP_Node; procedure Add_Call_To_ESL ( Call : in Programs.Call_T; Bounds : in Programs.Execution.Bounds_Ref; HRT : in HRT_Struct_T; Interacting : in Programs.Subprogram_Set_T; Called : in out Entry_Set_T; CCS : in out CCS_T; Column : in out Positive) -- Add ESL lines corresponding to the given call to the ESL. -- First WCP of the callee of the call is built and that is -- then converted to the ESL lines by calling subroutine -- "Convert_WCP_To_ESL", which in turn can call this subroutine, -- if a call to new subroutine is from some node of the WCP. is use type Flow.Node_Index_T; Graph : constant Flow.Graph_T := Programs.Flow_Graph (Programs.Callee (Call)); -- Flow graph of the called subroutine. Calls : constant Programs.Call_List_T := Programs.Calls_From (Programs.Callee (Call)); -- All calls from this subroutine. Call_Nodes : constant Flow.Node_List_T := Programs.Nodes (Calls); -- All nodes containing subroutine call. Luups : constant Loops.Loops_T := Programs.Loops_Of (Programs.Callee (Call)); -- Loops contained in the called subroutine. Counts : constant Programs.Execution.Flow_Counts_Ref := Programs.Execution.Counts (Bounds); -- Execution counts of the nodes and edges of the called -- subroutine. Forward_Edges : constant Flow.Edge_List_T := Loops.Forward_Edges ( Within => Graph, Avoiding => Luups); -- Edges pointing "forward" in the flow graph. Forward : Edge_Set_T(1..Flow.Max_Edge(Graph)); Executed : Edge_Set_T(1..Flow.Max_Edge(Graph)); WCP : WCP_T (Longest_Unrolled_Path( Graph => Graph, Luups => Luups)); -- WCP nodes storage (see comments of WCP_T and WCP_Table_T). procedure Add_Path_To_WCP ( First : in Flow.Node_T; Last : in Flow.Node_T; Fraction : in Loop_Fraction_T; CEC : in Positive; Recursion : in out Positive; WCP : in out WCP_T); -- Add nodes corresponding to given path to WCP. procedure Add_Loop_To_WCP ( Luup : in Loops.Loop_T; Head_Node : in Flow.Node_T; Loop_Factor : in Positive; Path_Fraction : in Loop_Fraction_T; CEC : in Positive; Recursion : in out Positive; WCP : in out WCP_T; Exit_Edge : out Flow.Edge_T); -- Add WCP nodes corresponding to the given loop -- taking into account loop unrolling when necessary. procedure Add_Path_To_WCP ( First : in Flow.Node_T; Last : in Flow.Node_T; Fraction : in Loop_Fraction_T; CEC : in Positive; Recursion : in out Positive; WCP : in out WCP_T) -- Add path from the given First flow graph node to the -- given Last flow graph node using the given execution -- count Fraction and Current Execution Count. -- Recursion and WCP are passed to "Add_Loop_To_WCP" when -- a loop head is detected. -- The WCP is updated when a flow graph node is not a -- loop head. is use type Flow.Node_T; Current : Flow.Node_T := First; Current_Index : Flow.Node_Index_T; -- Node being processed and the index of it. Natural_Count : Positive; Factored_Count : Positive; -- Unmodified execution count of a flow graph node -- and the execution count multiplied by the Fraction. Forward_Edge : Flow.Edge_T; -- Edge that points to the next node to be processed. begin -- Loop from first node to last: loop Current_Index := Flow.Index(Current); Natural_Count := Counts.Node(Current_Index); Factored_Count := Natural_Count * Fraction; -- Check if the node is a loop head: if execution -- count of the node after taking into account given -- "Fraction" parameter is bigger than the given -- execution count (CEC), the node is a loop head. if Factored_Count > CEC then -- This node is a loop head. -- The following commented outputs are TBA as a -- output of a TBD trace option (TBC): -- Output.Note (Text => "Loop head detected in WCP generation:" -- & Positive'image (Factored_Count / CEC) -- & " repeats, within" -- & Positive'image (CEC) -- & " times repeating path"); -- Output.Note (Text => "Loop head node :" -- & Flow.Node_Index_T'image (Flow.Index(Current))); -- Output.Note (Text => "Excution count:" -- & Positive'image (Natural_Count) -- & " multiplied by:" -- & Positive'image (Fraction.Numerator) -- & " /" -- & Positive'image (Fraction.Denominator)); Add_Loop_To_WCP ( Luup => Loops.Loop_Headed ( By => Current, Among => Luups), Head_Node => Current, Loop_Factor => Factored_Count/CEC, Path_Fraction => Fraction, CEC => CEC, Recursion => Recursion, WCP => WCP, Exit_Edge => Forward_Edge); -- Add WCP nodes corresponding to the loop nodes. -- The iteration will continue from the target -- of the returned loop exit edge. else -- This is not a loop head and it -- can be added to the WCP as a new node. Add_WCP_Node ( Node => ( Kind => Real_Node, Node => Current, Count => Factored_Count), WCP => WCP); -- Add this node to the WCP. if Current /= Last then Forward_Edge := Unique_Edge ( What => "forward", From => Flow.Edges_From (Node => Current, Within => Graph), Where => Forward and Executed); end if; end if; exit when Current = Last; -- The last node of the path is processed and it is time -- stop iteration. Current := Flow.Target (Forward_Edge); -- Move to next node. end loop; end Add_Path_To_WCP; procedure Add_Loop_To_WCP ( Luup : in Loops.Loop_T; Head_Node : in Flow.Node_T; Loop_Factor : in Positive; Path_Fraction : in Loop_Fraction_T; CEC : in Positive; Recursion : in out Positive; WCP : in out WCP_T; Exit_Edge : out Flow.Edge_T) -- Add WCP nodes corresponding to the given loop. If the -- loop exit edge does not leave from the "last" node of -- the loop, loop structure has to be modified so that -- edges to the nodes up to source of the exit edge are -- copied before the loop head and node following the -- source of the exit edge becomes new loop head. -- The loop head is marked with a "Loop Head" WCP -- node. is use type Flow.Node_T; Exit_Node : Flow.Node_T; -- Source of the edge exiting the loop. Repeat_Edge : Flow.Edge_T; -- The one repeat edge whose execution count > 0. Repeat_Node : Flow.Node_T; -- The source of the repeat edge (see above). begin if Recursion > Luups'Length then -- The recursion is gone too far and has to -- be stopped. Output.Fault ( Location => "Add loop to WCP", Text => "Recursion level overflow (" & Positive'image (Recursion) & " )"); raise Internal_Error; end if; Recursion := Recursion + 1; -- Increment recursion level. -- Search the effective loop exit edge. There should be -- exactly one. If there are none, the loop is eternal -- and if there are more than one, there are illegal -- branches in the loop. Exit_Edge := Unique_Edge ( What => "exit", From => Loops.Exit_Edges(Exiting => Luup, Within => Graph), Where => Executed); Exit_Node := Flow.Source (Exit_Edge); -- Search the effective loop repeat edge. There should be -- exactly one. There has to be at least one repeat edge -- in any loop. If there are more than one repeat edges, -- there are illegal branches in the loop. Repeat_Edge := Unique_Edge ( What => "repeat", From => Loops.Repeat_Edges (Repeating => Luup, Within => Graph), Where => Executed); Repeat_Node := Flow.Source (Repeat_Edge); -- If the source of the effective loop exit edge is not -- the same as the source of the effective loop repeat -- edge, the loop structure has to be modified for the -- WCP: edges to the nodes up to source of the exit node -- are "copied" to the WCP. if Repeat_Node = Exit_Node then -- "Repeat" node is same as "exit" node and the -- loop does need to be unrolled. Add_WCP_Node ( Node => (Kind => Loop_Head, Repeats => Loop_Factor), WCP => WCP); -- Mark the loop head with a virtual node. Add_Path_To_WCP ( First => Head_Node, Last => Exit_Node, Fraction => Path_Fraction, CEC => Loop_Factor * CEC, Recursion => Recursion, WCP => WCP); -- Add recursively nodes from loop head to the source -- of the repeat edge. Add_WCP_Node ( Node => (Kind => Loop_Exit), WCP => WCP); -- Mark the loop exit with a virtual node. else -- "Repeat" node is not same as "exit" node and -- the loop has to be unrolled. Add_Path_To_WCP ( First => Head_Node, Last => Exit_Node, Fraction => (1/Loop_Factor)*Path_Fraction, CEC => CEC, Recursion => Recursion, WCP => WCP); -- Add recursively nodes from (original) head node to -- exit node. Add_WCP_Node ( Node => (Kind => Loop_Head, Repeats => Loop_Factor - 1), WCP => WCP); -- Mark the loop head with a virtual node. Add_Path_To_WCP ( First => Flow.Target (Unique_Edge ( What => "loop continue", From => Loops.Edges_From ( Node => Exit_Node, Into => Luup, Within => Graph), Where => Forward and Executed)), Last => Repeat_Node, Fraction => Path_Fraction, CEC => Loop_Factor * CEC, Recursion => Recursion, WCP => WCP); -- Add recursively nodes from loop node following exit node -- until source of repeat edge. Add_Path_To_WCP ( First => Head_Node, Last => Exit_Node, Fraction => ((Loop_Factor - 1)/Loop_Factor)*Path_Fraction, CEC => (Loop_Factor - 1)*CEC, Recursion => Recursion, WCP => WCP); -- Add recursively nodes from loop head to loop exit. Add_WCP_Node ( Node => (Kind => Loop_Exit), WCP => WCP); -- Mark the loop exit with a virtual node. end if; Recursion := Recursion - 1; -- Decrement the recursion level. end Add_Loop_To_WCP; Return_Edges : constant Flow.Edge_List_T := Flow.Return_Edges (Graph); -- Edges whose target is the return node. Entry_Node : constant Flow.Node_T := Flow.Entry_Node (Graph); -- First node of the flow graph. Recursion : Positive := 1; begin -- Add_Call_To_ESL WCP.Length := 0; -- WCP list initially empty. Forward := (others => False); for F in Forward_Edges'range loop Forward (Flow.Index (Forward_Edges(F))) := True; end loop; for E in Counts.Edge'range loop Executed (E) := Counts.Edge (E) > 0; end loop; if Return_Edges'Length > 0 then -- There are more than one nodes in the flow graph -- and the path from entry node to the return node -- has to be added to the WCP. Add_Path_To_WCP ( First => Entry_Node, Last => Flow.Target (Unique_Edge ( What => "return", From => Return_Edges, Where => Executed)), Fraction => ( Numerator => 1, Denominator => 1), CEC => 1, Recursion => Recursion, WCP => WCP); else -- There is only one node in the flow graph and it -- can be simply added to the WCP. Add_WCP_Node ( Node => ( Kind => Real_Node, Node => Entry_Node, Count => Counts.Node(Flow.Index(Entry_Node))), WCP => WCP); end if; Convert_WCP_To_ESL ( WCP => WCP, HRT => HRT, Interacting => Interacting, Bounds => Bounds, Calls => Calls, Call_Nodes => Call_Nodes, Called => Called, CCS => CCS, Column => Column); -- Now the WCP is built and it has to be converted to -- ESL lines. end Add_Call_To_ESL; procedure Generate ( TPOF_Name : in String; Program : in out Programs.Program_T; Asserts : in out Assertions.Assertion_Set_T; Bounds_Set : out Programs.Execution.Bounds_Set_T) is HRT : HRT_Struct_T; ESF_Name : String := TPOF.Check_TPOF_Name(TPOF_Name); begin -- Read the information in TPO file. TPOF.Get_TPOF (TPOF_Name, Program, HRT); -- Simplifying assumption: Each thread body (= one activation) -- is already isolated in a subprogram, which is named in the -- TPOF. Automatic isolation of the body of an eternal -- thread-loop is not done (RB XS.TA.10 is not implemented). -- Analyse flow, calls, loops and WCET: Analyser.Analyse ( Program => Program, Asserts => Asserts, Bounds_Set => Bounds_Set); -- All the results of the above analysis are available -- via the HRT structure, going from a task or entry to -- the corresponding subprogram and then to its flow-graph, -- annotated with worst-case execution counts. -- The analysis results for the non-root subprograms -- are accessed via the calls in the flow-graph which refer -- to the callee subprograms. -- Sanity checks on HRT structure: Check_Sanity (HRT => HRT); -- Construct the Execution Skeletons: Build_HRT_Skeletons ( HRT => HRT, Program => Program, Bounds_Set => Bounds_Set, File_Name => ESF_Name); end Generate; procedure Build_HRT_Skeletons ( HRT : in out HRT_Struct_T; Program : in Programs.Program_T; Bounds_Set : in Programs.Execution.Bounds_Set_T; File_Name : in String) -- -- Using : -- HRT structure from TPOF, -- program under analysis, -- execution bounds for the program's HRT entities, -- file-name for the ESF file. -- Giving: -- execution skeletons of all threads and PO entries, -- inserted into the ESF file. -- is Interacting : Programs.Subprogram_Set_T; Definitions : constant Def_List_T := Def_Vectors.To_Vector (HRT.Definitions); procedure Put_Thread (Def : in Def_T) -- -- Inserts thread information into the ESF file using -- the given definition. -- is Own_Entries : Entry_Set_T; begin Ada.Text_IO.Put_Line( File => ESF.File, Item => " thread " & Def.Thread_Name.all); -- Begin the thread "block". if Def.Comments /= null then -- Insert comments. for C in Def.Comments'Range loop Ada.Text_IO.Put_Line( File => ESF.File, Item => " " & Def.Comments(C).all); end loop; end if; case Def.Thread_Kind is -- Insert the type of the thread. when Cyclic => Ada.Text_IO.Put_Line( File => ESF.File, Item => " type cyclic"); when Sporadic => Ada.Text_IO.Put_Line( File => ESF.File, Item => " type sporadic"); when Interrupt_Sporadic => Ada.Text_IO.Put_Line( File => ESF.File, Item => " type interrupt_sporadic"); end case; Erase (Own_Entries); -- Threads don't have PO Entries. Build_Skeleton ( Call => Def.Root.Call, HRT => HRT, Interacting => Interacting, Own_Entries => Own_Entries, Bounds_Set => Bounds_Set); -- Build execution skeleton and insert it into the -- ESF file. Ada.Text_IO.Put_Line( File => ESF.File, Item => " end " & Def.Thread_Name.all); -- End the thread "block". end Put_Thread; procedure Put_Resource (Def : in Def_T) -- Insert the resource object information into the ESF -- file using the given definition. is Entries : constant Entry_List_T := Entry_Vectors.To_Vector (Def.PO_Entries); -- Entries of this object. Own_Entries : Entry_Set_T; -- Set of the entries. begin Entry_Bags.Assign ( Object => Own_Entries, Value => Entry_Bags.List(Entries)); -- Convert the entry list to entry set. Ada.Text_IO.Put_Line( File => ESF.File, Item => " protected " & Def.Res_Name.all); -- Begin the protected object "block". if Def.Comments /= null then -- Insert comments. for C in Def.Comments'Range loop Ada.Text_IO.Put_Line( File => ESF.File, Item => " " & Def.Comments(C).all); end loop; end if; Ada.Text_IO.Put_Line( File => ESF.File, Item => " type resource"); -- Insert the type of the object. for E in Entries'range loop -- Process the entries of the object. Ada.Text_IO.Put_Line( File => ESF.File, Item => " entry " & Entries(E).Name.all); -- Insert the entry name. Build_Skeleton( Call => Entries(E).Call, HRT => HRT, Interacting => Interacting, Own_Entries => Own_Entries, Bounds_Set => Bounds_Set); -- Build the execution skeleton and insert it into -- the ESF file. end loop; Ada.Text_IO.Put_Line( File => ESF.File, Item => " end " & Def.Res_Name.all); -- End the protected object "block". end Put_Resource; procedure Put_Synchro (Def : in Def_T) -- Insert the synchro object information into the -- ESF file using the given definition. is Own_Entries : Entry_Set_T; begin Erase (Own_Entries); -- Initialize the set of the entries of this PO -- to empty. Add (To => Own_Entries, Adding => Def.PO_Entry); Add (To => Own_Entries, Adding => Def.Barriered); -- Add the entries of this PO to the set. Ada.Text_IO.Put_Line( File => ESF.File, Item => " protected " & Def.Sync_Name.all); -- Begin the protected object "block". if Def.Comments /= null then -- Insert comments. for C in Def.Comments'Range loop Ada.Text_IO.Put_Line( File => ESF.File, Item => " " & Def.Comments(C).all); end loop; end if; Ada.Text_IO.Put_Line( File => ESF.File, Item => " type synchro"); -- Insert the type of the object. Ada.Text_IO.Put_Line( File => ESF.File, Item => " entry " & Def.PO_Entry.Name.all); -- Insert the name of the entry. Build_Skeleton( Call => Def.PO_Entry.Call, HRT => HRT, Interacting => Interacting, Own_Entries => Own_Entries, Bounds_Set => Bounds_Set); -- Build the execution skeleton and insert it into -- the ESF file. Ada.Text_IO.Put_Line( File => ESF.File, Item => " barrier wcet tbd, tbd, tbd"); -- Insert the barrier wcet. Ada.Text_IO.Put_Line( File => ESF.File, Item => " entry " & Def.Barriered.Name.all); -- Insert the barriered entry name. Build_Skeleton( Call => Def.Barriered.Call, HRT => HRT, Interacting => Interacting, Own_Entries => Own_Entries, Bounds_Set => Bounds_Set); -- Build execution skeleton and insert it into -- the ESF file. Ada.Text_IO.Put_Line( File => ESF.File, Item => " end " & Def.Sync_Name.all); -- End the protected object "block". end Put_Synchro; begin Output.Note (Text => "Execution Skeleton File" & Output.Field_Separator & File_Name); ESF.Create (File_Name); -- Create (and open) the ESF file. Ada.Text_IO.Put_Line ( File => ESF.File, Item => " program " & HRT.Prog_Name.all); -- Insert the name of the HRT program into the ESF file. if HRT.Comments /= null then -- Insert comments. for C in HRT.Comments'Range loop Ada.Text_IO.Put_Line( File => ESF.File, Item => " " & HRT.Comments(C).all); end loop; end if; Interacting := Interacting_Subprograms (Program, HRT); -- Find the subprograms that call PO entries and for which -- we thus need worst-case execution paths. -- Loop through all definitions in the HRT structure: for D in Definitions'range loop Ada.Text_IO.New_Line(File => ESF.File); case Definitions(D).Kind is when Thread => Put_Thread(Def => Definitions(D)); -- Insert the Thread information to the ESF file. when Resource => Put_Resource(Def => Definitions(D)); -- Insert the Resource Object information to the -- ESF file. when Synchro => Put_Synchro(Def => Definitions(D)); -- Insert the Synchro Object information to the -- ESF file. end case; end loop; Ada.Text_IO.Put_Line ( File => ESF.File, Item => " end " & HRT.Prog_Name.all); ESF.Close; exception when Ada.Text_IO.Use_Error | Ada.Text_IO.Status_Error | Ada.Text_IO.Name_Error => Output.Error (Text => "Unable to create execution skeleton file " & File_Name & "."); raise ESF_Error; end Build_HRT_Skeletons; procedure Build_Skeleton ( Call : in Programs.Call_T; HRT : in HRT_Struct_T; Interacting : in Programs.Subprogram_Set_T; Own_Entries : in Entry_Set_T; Bounds_Set : in Programs.Execution.Bounds_Set_T) -- Using : -- A root call (with completed WCET analysis), -- HRT structure, -- interacting subprograms, -- set of Entries belonging to same PO (in case of PO) -- Giving: -- Execution statement list for the subprogram into -- the ESF file, -- List of other possible PO calls which however were -- not called in the worst case execution into the -- ESF File. is Called : Entry_Set_T; -- All PO Entries called in the path starting from the -- root subprogram. All_Entries : constant Entry_List_T := To_List (HRT.PO_Entries); -- All PO Entries defined in the TPOF file. Possible_Entries : Entry_Set_T; -- PO Entries that could be called. procedure Add_PO_Calls (Root : Programs.Subprogram_T) -- Add all PO Entries that can be called from -- the given subroutine to the set of PO Entries -- that could be called in some execution. is Calls : constant Programs.Call_List_T := Programs.Calls_From (Root); begin for C in Calls'Range loop declare Callee : constant Programs.Subprogram_T := Programs.Callee(Calls(C)); New_Entry : constant Entry_T := Search(Callee, HRT.PO_Entries); -- Search the called subroutine from the -- set of all PO Entries. Null is returned -- if it is not found. begin if New_Entry /= null then Add(To => Possible_Entries, Adding => New_Entry); -- Add the found entry to the set of PO Entries -- that could be called in some execution. end if; Add_PO_Calls(Callee); -- Include indirect calls by recursion. end; end loop; end Add_PO_Calls; begin -- Traverse the WCP and list Execution Statements: List_Execution_Statements ( Call, Programs.Execution.Bounds_For ( Root => Call, Within => Bounds_Set), HRT, Interacting, Called); -- List the PO entries called by other paths: Erase (Possible_Entries); -- Initialize set of possible PO Entries to empty. Add_PO_Calls (Programs.Callee (Call)); -- Add recursively all PO Entries that could be called -- by any execution path. for E in All_Entries'range loop -- Loop through all PO Entries if not Is_Member(Item => All_Entries(E), Of_Set => Called) -- The PO Entry was not called in the investigated path and not Is_Member(Item => All_Entries(E), Of_Set => Own_Entries) -- and is not a entry of a same protected object and Is_Member(Item => All_Entries(E), Of_Set => Possible_Entries) -- but could be called in some other execution path then case All_Entries(E).Def.Kind is when Resource => Ada.Text_IO.Put_Line ( File => ESF.File, Item => " po " & All_Entries(E).Def.Res_Name.all & " " & All_Entries(E).Name.all); when Synchro => Ada.Text_IO.Put_Line ( File => ESF.File, Item => " po " & All_Entries(E).Def.Sync_Name.all & " " & All_Entries(E).Name.all); when Thread => null; -- impossible end case; end if; end loop; end Build_Skeleton; procedure List_Execution_Statements ( Call : in Programs.Call_T; Bounds : in Programs.Execution.Bounds_Ref; HRT : in HRT_Struct_T; Interacting : in Programs.Subprogram_Set_T; Called : out Entry_Set_T) -- -- Using : -- A root call (with completed WCET analysis), -- execution bounds, -- HRT structure, -- interacting subprograms, -- Giving: -- execution statement list into the ESF file, -- set of called PO Entries is use type Processor.Time_T; CCS : CCS_T := (0,0,0); -- Initialise the CCS to all zeroes. Column : Positive := 8; -- Initial indention. begin Erase (Called); -- Initialize set of called entries to empty. Add_Call_To_ESL ( Call => Call, Bounds => Bounds, HRT => HRT, Interacting => Interacting, Called => Called, CCS => CCS, Column => Column); -- Add recursively execution statements of all called -- subroutines starting from the root subroutine to -- the execution statement list. if CCS.Time > 0 then -- Some part of "wcet" is not yet included in the -- output (ESF file). Put_ESL ( Line => "wcet" & Processor.Time_T'image (CCS.Time) & " ," & Natural'image(CCS.Reads) & " ," & Natural'image(CCS.Writes), Column => Column); end if; end List_Execution_Statements; end HRT.Skeleton;
zhmu/ananas
Ada
342
adb
with System; use System; package body Deferred_Const3_Pkg is procedure Dummy is begin null; end; begin if C1'Address /= C'Address then raise Program_Error; end if; if C2'Address /= C'Address then raise Program_Error; end if; if C3'Address /= C'Address then raise Program_Error; end if; end Deferred_Const3_Pkg;
AaronC98/PlaneSystem
Ada
5,515
adb
------------------------------------------------------------------------------ -- Ada Web Server -- -- -- -- Copyright (C) 2000-2014, AdaCore -- -- -- -- This library is free software; you can redistribute it and/or modify -- -- it under terms of the GNU General Public License as published by the -- -- Free Software Foundation; either version 3, or (at your option) any -- -- later version. This library is distributed in the hope that it will be -- -- useful, but WITHOUT ANY WARRANTY; without even the implied warranty of -- -- MERCHANTABILITY or FITNESS FOR A PARTICULAR PURPOSE. -- -- -- -- -- -- -- -- -- -- -- -- 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/>. -- -- -- -- -- -- -- -- -- -- -- -- -- -- -- ------------------------------------------------------------------------------ with Ada.Unchecked_Conversion; with AWS.Config.Set; with AWS.Messages; with AWS.Parameters; with AWS.Server; with AWS.Status; with AWS.Utils; package body AWS.Communication.Server is Com_Server : AWS.Server.HTTP; -- The server that will handle all communication requests Context : T_Access; -- The context kept for each server type Internal_Callback is not null access function (Request : Status.Data) return Response.Data; -- This is the internal callback access type. It is not possible to use -- Receive'Access for as the callback address as the Response.Callback is -- outside generic package. We then use Unchecked_Conversion to convert -- value from Internal_Callback to Callback. Note that this type -- definition must match exactly the Response.Callback definition. function To_Callback is new Ada.Unchecked_Conversion (Internal_Callback, Response.Callback); -- Conversion function from the internal callback representation to the -- standard and user visible callback type. function Receive (Request : Status.Data) return Response.Data; -- Handle communication server message ------------- -- Receive -- ------------- function Receive (Request : Status.Data) return Response.Data is URI : constant String := Status.URI (Request); P_Set : constant AWS.Parameters.List := Status.Parameters (Request); procedure Fill_Parameter_Set; -- Put all paramters into the PS structure -- ??? there is a limit of 100 parameters, seems enough anyway PS : Parameter_Set (1 .. 100); I : Natural := 0; ------------------------ -- Fill_Parameter_Set -- ------------------------ procedure Fill_Parameter_Set is begin for K in PS'Range loop declare P : constant String := 'P' & Utils.Image (K); begin if AWS.Parameters.Get (P_Set, P) /= "" then I := I + 1; PS (I) := To_Unbounded_String (AWS.Parameters.Get (P_Set, P)); end if; end; end loop; end Fill_Parameter_Set; begin if URI = AWS_Com then Fill_Parameter_Set; return Callback (AWS.Parameters.Get (P_Set, "HOST"), AWS.Parameters.Get (P_Set, "NAME"), Context, PS (1 .. I)); else return Response.Acknowledge (Messages.S412, "AWS communication message error!"); end if; end Receive; -------------- -- Shutdown -- -------------- procedure Shutdown is begin AWS.Server.Shutdown (Com_Server); end Shutdown; ----------- -- Start -- ----------- procedure Start (Port : Positive; Context : T_Access; Host : String := "") is CB : constant Internal_Callback := Receive'Access; CNF : Config.Object; begin Server.Context := Context; Config.Set.Server_Name (CNF, "Communication Server"); Config.Set.Server_Host (CNF, Host); Config.Set.Server_Port (CNF, Port); Config.Set.Max_Connection (CNF, 1); AWS.Server.Start (Com_Server, To_Callback (CB), Config => CNF); end Start; end AWS.Communication.Server;
melwyncarlo/ProjectEuler
Ada
303
adb
with Ada.Text_IO; with Ada.Integer_Text_IO; -- Copyright 2021 Melwyn Francis Carlo procedure A063 is use Ada.Text_IO; use Ada.Integer_Text_IO; Str : constant String (1 .. 12) := "Hello World "; Num : constant Integer := 2021; begin Put (Str); Put (Num, Width => 0); end A063;
AdaCore/training_material
Ada
368
adb
package body Crc is type Array_T is array (Positive range <>) of Crc_T; function Generate (Address : System.Address; Size : Natural) return Crc_T is Retval : Crc_T := 0; begin -- Create an object of the appropriate size at Address -- and then sum the contents of the object return Retval; end Generate; end Crc;
AdaCore/libadalang
Ada
120
ads
package Base is type Base_Type is tagged null record; procedure Base_Method (Self : Base_Type) is null; end Base;
landgraf/nanomsg-ada
Ada
3,619
adb
-- The MIT License (MIT) -- Copyright (c) 2015 Pavel Zhukov <[email protected]> -- 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 Nanomsg.Domains; with Nanomsg.Survey; with Aunit.Assertions; with Nanomsg.Messages; with Ada.Text_Io; package body Nanomsg.Test_Survey is procedure Run_Test (T : in out TC) is use Aunit.Assertions; Address : constant String := "tcp://127.0.0.1:5555"; Ping : constant String := "PING"; Pong : constant String := "PONG"; task Server is entry Start; end Server; task body Server is begin T.Server.Init (Nanomsg.Domains.Af_Sp, Nanomsg.Survey.Nn_Surveyor); T.Server.Bind ("tcp://*:5555"); delay 1.0; accept Start; declare Msg : Nanomsg.Messages.Message_T; begin Msg.From_String (Ping); T.Server.Send (Msg); end; for X in T.Clients'Range loop declare Msg : Nanomsg.Messages.Message_T; begin select delay 2.0; Assert (False, "Abort in server"); then abort T.Server.Receive (Msg); end select; end; end loop; end Server; begin for Client of T.Clients loop Client.Init (Nanomsg.Domains.Af_Sp, Nanomsg.Survey.Nn_Respondent); Client.Connect (Address); end loop; Server.Start; for Client of T.Clients loop declare Msg : Nanomsg.Messages.Message_T; begin select delay 2.0; Assert (False, "Recv aborted"); then abort Client.Receive (Msg); end select; Assert (Msg.Text = Ping, "Ping request doesn't match"); end; end loop; for Client of T.Clients loop declare Msg : Nanomsg.Messages.Message_T; begin Msg.From_String (Pong); Client.Send (Msg); end; end loop; end Run_Test; function Name (T : TC) return Message_String is begin return Aunit.Format ("Test case name : Survey test"); end Name; procedure Tear_Down (T : in out Tc) is begin if T.Server.Get_Fd >= 0 then T.Server.Close; end if; for Client of T.Clients loop if Client.Get_Fd >= 0 then Client.Close; end if; end loop; end Tear_Down; end Nanomsg.Test_Survey;
tum-ei-rcs/StratoX
Ada
450
ads
-- Institution: Technische Universität München -- Department: Realtime Computer Systems (RCS) -- Project: StratoX -- Module: Units -- -- Authors: Emanuel Regnath ([email protected]) -- -- Description: Additional units for navigation -- with Interfaces; package Units.Navigation with SPARK_Mode is subtype Heading_Type is Angle_Type range 0.0 * Degree .. DEGREE_360; function foo return Heading_Type; end Units.Navigation;
godunko/adawebui
Ada
6,290
adb
------------------------------------------------------------------------------ -- -- -- Matreshka Project -- -- -- -- Web Framework -- -- -- -- Runtime Library Component -- -- -- ------------------------------------------------------------------------------ -- -- -- Copyright © 2017-2020, 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: 5704 $ $Date: 2017-01-20 23:11:33 +0300 (Fri, 20 Jan 2017) $ ------------------------------------------------------------------------------ package body Web.Core.Connectables.Slots_0.Slots_1.Slots_2.Generic_Emitters is ------------- -- Connect -- ------------- overriding procedure Connect (Self : in out Emitter; Slot : Slots_0.Slot'Class) is Slot_End : Slot_End_Access := Slot.Create_Slot_End; Signal_End : Signal_End_Access := new Signal_End_0 (Self'Unchecked_Access); begin Slot_End.Attach; Signal_End.Attach; Signal_End.Slot_End := Slot_End; end Connect; ------------- -- Connect -- ------------- overriding procedure Connect (Self : in out Emitter; Slot : Slots_1.Slot'Class) is Slot_End : Slot_End_Access := Slot.Create_Slot_End; Signal_End : Signal_End_Access := new Signal_End_1 (Self'Unchecked_Access); begin Slot_End.Attach; Signal_End.Attach; Signal_End.Slot_End := Slot_End; end Connect; ------------- -- Connect -- ------------- overriding procedure Connect (Self : in out Emitter; Slot : Slots_2.Slot'Class) is Slot_End : Slot_End_Access := Slot.Create_Slot_End; Signal_End : Signal_End_Access := new Signal_End_2 (Self'Unchecked_Access); begin Slot_End.Attach; Signal_End.Attach; Signal_End.Slot_End := Slot_End; end Connect; ---------- -- Emit -- ---------- procedure Emit (Self : in out Emitter'Class; Parameter_1 : Parameter_1_Type; Parameter_2 : Parameter_2_Type) is Current : Signal_End_Access := Self.Head; begin while Current /= null loop begin Signal_End'Class (Current.all).Invoke (Parameter_1, Parameter_2); exception when others => null; end; Current := Current.Next; end loop; end Emit; ------------ -- Invoke -- ------------ overriding procedure Invoke (Self : in out Signal_End_0; Parameter_1 : Parameter_1_Type; Parameter_2 : Parameter_2_Type) is pragma Unreferenced (Parameter_1); pragma Unreferenced (Parameter_2); begin Slot_End_0'Class (Self.Slot_End.all).Invoke; end Invoke; ------------ -- Invoke -- ------------ overriding procedure Invoke (Self : in out Signal_End_1; Parameter_1 : Parameter_1_Type; Parameter_2 : Parameter_2_Type) is pragma Unreferenced (Parameter_2); begin Slot_End_1'Class (Self.Slot_End.all).Invoke (Parameter_1); end Invoke; ------------ -- Invoke -- ------------ overriding procedure Invoke (Self : in out Signal_End_2; Parameter_1 : Parameter_1_Type; Parameter_2 : Parameter_2_Type) is begin Slot_End_2'Class (Self.Slot_End.all).Invoke (Parameter_1, Parameter_2); end Invoke; end Web.Core.Connectables.Slots_0.Slots_1.Slots_2.Generic_Emitters;
reznikmm/matreshka
Ada
3,624
ads
------------------------------------------------------------------------------ -- -- -- Matreshka Project -- -- -- -- Ada Modeling Framework -- -- -- -- Runtime Library Component -- -- -- ------------------------------------------------------------------------------ -- -- -- Copyright © 2011-2012, Vadim Godunko <[email protected]> -- -- All rights reserved. -- -- -- -- Redistribution and use in source and binary forms, with or without -- -- modification, are permitted provided that the following conditions -- -- are met: -- -- -- -- * Redistributions of source code must retain the above copyright -- -- notice, this list of conditions and the following disclaimer. -- -- -- -- * Redistributions in binary form must reproduce the above copyright -- -- notice, this list of conditions and the following disclaimer in the -- -- documentation and/or other materials provided with the distribution. -- -- -- -- * Neither the name of the Vadim Godunko, IE nor the names of its -- -- contributors may be used to endorse or promote products derived from -- -- this software without specific prior written permission. -- -- -- -- THIS SOFTWARE IS PROVIDED BY THE COPYRIGHT HOLDERS AND CONTRIBUTORS -- -- "AS IS" AND ANY EXPRESS OR IMPLIED WARRANTIES, INCLUDING, BUT NOT -- -- LIMITED TO, THE IMPLIED WARRANTIES OF MERCHANTABILITY AND FITNESS FOR -- -- A PARTICULAR PURPOSE ARE DISCLAIMED. IN NO EVENT SHALL THE COPYRIGHT -- -- HOLDER OR CONTRIBUTORS BE LIABLE FOR ANY DIRECT, INDIRECT, INCIDENTAL, -- -- SPECIAL, EXEMPLARY, OR CONSEQUENTIAL DAMAGES (INCLUDING, BUT NOT LIMITED -- -- TO, PROCUREMENT OF SUBSTITUTE GOODS OR SERVICES; LOSS OF USE, DATA, OR -- -- PROFITS; OR BUSINESS INTERRUPTION) HOWEVER CAUSED AND ON ANY THEORY OF -- -- LIABILITY, WHETHER IN CONTRACT, STRICT LIABILITY, OR TORT (INCLUDING -- -- NEGLIGENCE OR OTHERWISE) ARISING IN ANY WAY OUT OF THE USE OF THIS -- -- SOFTWARE, EVEN IF ADVISED OF THE POSSIBILITY OF SUCH DAMAGE. -- -- -- ------------------------------------------------------------------------------ -- $Revision$ $Date$ ------------------------------------------------------------------------------ -- This file is generated, don't edit it. ------------------------------------------------------------------------------ with AMF.Elements.Generic_Hash; function AMF.UMLDI.UML_Name_Labels.Hash is new AMF.Elements.Generic_Hash (UMLDI_UML_Name_Label, UMLDI_UML_Name_Label_Access);
charlie5/lace
Ada
3,113
ads
-- This file is generated by SWIG. Please do *not* modify by hand. -- with Interfaces.C; with Interfaces.C.Strings; with osmesa_c.Pointers; with Swig; with Swig.Pointers; with Interfaces.C; package osmesa_c.Binding is function OSMesaCreateContext (format : in osmesa_c.GLenum; sharelist : in osmesa_c.OSMesaContext) return osmesa_c.OSMesaContext; function OSMesaCreateContextExt (format : in osmesa_c.GLenum; depthBits : in osmesa_c.GLint; stencilBits : in osmesa_c.GLint; accumBits : in osmesa_c.GLint; sharelist : in osmesa_c.OSMesaContext) return osmesa_c.OSMesaContext; procedure OSMesaDestroyContext (ctx : in osmesa_c.OSMesaContext); function OSMesaMakeCurrent (ctx : in osmesa_c.OSMesaContext; buffer : in Swig.void_ptr; the_type : in osmesa_c.GLenum; width : in osmesa_c.GLsizei; height : in osmesa_c.GLsizei) return osmesa_c.GLboolean; function OSMesaGetCurrentContext return osmesa_c.OSMesaContext; procedure OSMesaPixelStore (pname : in osmesa_c.GLint; value : in osmesa_c.GLint); procedure OSMesaGetIntegerv (pname : in osmesa_c.GLint; value : in osmesa_c.Pointers.GLint_Pointer); function OSMesaGetDepthBuffer (c : in osmesa_c.OSMesaContext; width : in osmesa_c.Pointers.GLint_Pointer; height : in osmesa_c.Pointers.GLint_Pointer; bytesPerValue : in osmesa_c.Pointers.GLint_Pointer; buffer : in Swig.Pointers.void_ptr_Pointer) return osmesa_c.GLboolean; function OSMesaGetColorBuffer (c : in osmesa_c.OSMesaContext; width : in osmesa_c.Pointers.GLint_Pointer; height : in osmesa_c.Pointers.GLint_Pointer; format : in osmesa_c.Pointers.GLint_Pointer; buffer : in Swig.Pointers.void_ptr_Pointer) return osmesa_c.GLboolean; function OSMesaGetProcAddress (funcName : in Interfaces.C.Strings.chars_ptr) return osmesa_c.OSMESAproc; procedure OSMesaColorClamp (enable : in osmesa_c.GLboolean); procedure OSMesaPostprocess (osmesa : in osmesa_c.OSMesaContext; filter : in Interfaces.C.Strings.chars_ptr; enable_value : in Interfaces.C.unsigned); private pragma Import (C, OSMesaCreateContext, "Ada_OSMesaCreateContext"); pragma Import (C, OSMesaCreateContextExt, "Ada_OSMesaCreateContextExt"); pragma Import (C, OSMesaDestroyContext, "Ada_OSMesaDestroyContext"); pragma Import (C, OSMesaMakeCurrent, "Ada_OSMesaMakeCurrent"); pragma Import (C, OSMesaGetCurrentContext, "Ada_OSMesaGetCurrentContext"); pragma Import (C, OSMesaPixelStore, "Ada_OSMesaPixelStore"); pragma Import (C, OSMesaGetIntegerv, "Ada_OSMesaGetIntegerv"); pragma Import (C, OSMesaGetDepthBuffer, "Ada_OSMesaGetDepthBuffer"); pragma Import (C, OSMesaGetColorBuffer, "Ada_OSMesaGetColorBuffer"); pragma Import (C, OSMesaGetProcAddress, "Ada_OSMesaGetProcAddress"); pragma Import (C, OSMesaColorClamp, "Ada_OSMesaColorClamp"); pragma Import (C, OSMesaPostprocess, "Ada_OSMesaPostprocess"); end osmesa_c.Binding;
reznikmm/matreshka
Ada
3,775
adb
------------------------------------------------------------------------------ -- -- -- Matreshka Project -- -- -- -- Localization, Internationalization, Globalization for Ada -- -- -- -- Testsuite Component -- -- -- ------------------------------------------------------------------------------ -- -- -- Copyright © 2015, 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$ ------------------------------------------------------------------------------ -- Check that Universal_String.Index doesn't raise exception when pattern -- string is longer then string to lookup in. ------------------------------------------------------------------------------ with League.Strings; procedure Test_390 is X : League.Strings.Universal_String := League.Strings.To_Universal_String ("ENV_IN"); begin if X.Index ("ENV_OUT") /= 0 then raise Program_Error; end if; end Test_390;
reznikmm/matreshka
Ada
6,860
adb
------------------------------------------------------------------------------ -- -- -- Matreshka Project -- -- -- -- Open Document Toolkit -- -- -- -- Runtime Library Component -- -- -- ------------------------------------------------------------------------------ -- -- -- Copyright © 2014, Vadim Godunko <[email protected]> -- -- All rights reserved. -- -- -- -- Redistribution and use in source and binary forms, with or without -- -- modification, are permitted provided that the following conditions -- -- are met: -- -- -- -- * Redistributions of source code must retain the above copyright -- -- notice, this list of conditions and the following disclaimer. -- -- -- -- * Redistributions in binary form must reproduce the above copyright -- -- notice, this list of conditions and the following disclaimer in the -- -- documentation and/or other materials provided with the distribution. -- -- -- -- * Neither the name of the Vadim Godunko, IE nor the names of its -- -- contributors may be used to endorse or promote products derived from -- -- this software without specific prior written permission. -- -- -- -- THIS SOFTWARE IS PROVIDED BY THE COPYRIGHT HOLDERS AND CONTRIBUTORS -- -- "AS IS" AND ANY EXPRESS OR IMPLIED WARRANTIES, INCLUDING, BUT NOT -- -- LIMITED TO, THE IMPLIED WARRANTIES OF MERCHANTABILITY AND FITNESS FOR -- -- A PARTICULAR PURPOSE ARE DISCLAIMED. IN NO EVENT SHALL THE COPYRIGHT -- -- HOLDER OR CONTRIBUTORS BE LIABLE FOR ANY DIRECT, INDIRECT, INCIDENTAL, -- -- SPECIAL, EXEMPLARY, OR CONSEQUENTIAL DAMAGES (INCLUDING, BUT NOT LIMITED -- -- TO, PROCUREMENT OF SUBSTITUTE GOODS OR SERVICES; LOSS OF USE, DATA, OR -- -- PROFITS; OR BUSINESS INTERRUPTION) HOWEVER CAUSED AND ON ANY THEORY OF -- -- LIABILITY, WHETHER IN CONTRACT, STRICT LIABILITY, OR TORT (INCLUDING -- -- NEGLIGENCE OR OTHERWISE) ARISING IN ANY WAY OUT OF THE USE OF THIS -- -- SOFTWARE, EVEN IF ADVISED OF THE POSSIBILITY OF SUCH DAMAGE. -- -- -- ------------------------------------------------------------------------------ -- $Revision$ $Date$ ------------------------------------------------------------------------------ with Matreshka.DOM_Documents; with Matreshka.ODF_String_Constants; with ODF.DOM.Iterators; with ODF.DOM.Visitors; package body Matreshka.ODF_Text.Expression_Elements is ------------ -- Create -- ------------ overriding function Create (Parameters : not null access Matreshka.DOM_Elements.Element_L2_Parameters) return Text_Expression_Element_Node is begin return Self : Text_Expression_Element_Node do Matreshka.ODF_Text.Constructors.Initialize (Self'Unchecked_Access, Parameters.Document, Matreshka.ODF_String_Constants.Text_Prefix); end return; end Create; ---------------- -- Enter_Node -- ---------------- overriding procedure Enter_Node (Self : not null access Text_Expression_Element_Node; Visitor : in out XML.DOM.Visitors.Abstract_Visitor'Class; Control : in out XML.DOM.Visitors.Traverse_Control) is begin if Visitor in ODF.DOM.Visitors.Abstract_ODF_Visitor'Class then ODF.DOM.Visitors.Abstract_ODF_Visitor'Class (Visitor).Enter_Text_Expression (ODF.DOM.Text_Expression_Elements.ODF_Text_Expression_Access (Self), Control); else Matreshka.DOM_Elements.Abstract_Element_Node (Self.all).Enter_Node (Visitor, Control); end if; end Enter_Node; -------------------- -- Get_Local_Name -- -------------------- overriding function Get_Local_Name (Self : not null access constant Text_Expression_Element_Node) return League.Strings.Universal_String is pragma Unreferenced (Self); begin return Matreshka.ODF_String_Constants.Expression_Element; end Get_Local_Name; ---------------- -- Leave_Node -- ---------------- overriding procedure Leave_Node (Self : not null access Text_Expression_Element_Node; Visitor : in out XML.DOM.Visitors.Abstract_Visitor'Class; Control : in out XML.DOM.Visitors.Traverse_Control) is begin if Visitor in ODF.DOM.Visitors.Abstract_ODF_Visitor'Class then ODF.DOM.Visitors.Abstract_ODF_Visitor'Class (Visitor).Leave_Text_Expression (ODF.DOM.Text_Expression_Elements.ODF_Text_Expression_Access (Self), Control); else Matreshka.DOM_Elements.Abstract_Element_Node (Self.all).Leave_Node (Visitor, Control); end if; end Leave_Node; ---------------- -- Visit_Node -- ---------------- overriding procedure Visit_Node (Self : not null access Text_Expression_Element_Node; Iterator : in out XML.DOM.Visitors.Abstract_Iterator'Class; Visitor : in out XML.DOM.Visitors.Abstract_Visitor'Class; Control : in out XML.DOM.Visitors.Traverse_Control) is begin if Iterator in ODF.DOM.Iterators.Abstract_ODF_Iterator'Class then ODF.DOM.Iterators.Abstract_ODF_Iterator'Class (Iterator).Visit_Text_Expression (Visitor, ODF.DOM.Text_Expression_Elements.ODF_Text_Expression_Access (Self), Control); else Matreshka.DOM_Elements.Abstract_Element_Node (Self.all).Visit_Node (Iterator, Visitor, Control); end if; end Visit_Node; begin Matreshka.DOM_Documents.Register_Element (Matreshka.ODF_String_Constants.Text_URI, Matreshka.ODF_String_Constants.Expression_Element, Text_Expression_Element_Node'Tag); end Matreshka.ODF_Text.Expression_Elements;
reznikmm/matreshka
Ada
320,224
ads
------------------------------------------------------------------------------ -- -- -- Matreshka Project -- -- -- -- Ada Modeling Framework -- -- -- -- Runtime Library Component -- -- -- ------------------------------------------------------------------------------ -- -- -- Copyright © 2010-2017, 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 Matreshka.Internals.Strings; package AMF.Internals.Tables.UML_String_Data_02 is -- "Specifies whether existing classifiers should be removed before adding the new classifiers." MS_0200 : aliased Matreshka.Internals.Strings.Shared_String := (Capacity => 95, Unused => 91, Length => 91, Value => (16#0053#, 16#0070#, 16#0065#, 16#0063#, 16#0069#, 16#0066#, 16#0069#, 16#0065#, 16#0073#, 16#0020#, 16#0077#, 16#0068#, 16#0065#, 16#0074#, 16#0068#, 16#0065#, 16#0072#, 16#0020#, 16#0065#, 16#0078#, 16#0069#, 16#0073#, 16#0074#, 16#0069#, 16#006E#, 16#0067#, 16#0020#, 16#0063#, 16#006C#, 16#0061#, 16#0073#, 16#0073#, 16#0069#, 16#0066#, 16#0069#, 16#0065#, 16#0072#, 16#0073#, 16#0020#, 16#0073#, 16#0068#, 16#006F#, 16#0075#, 16#006C#, 16#0064#, 16#0020#, 16#0062#, 16#0065#, 16#0020#, 16#0072#, 16#0065#, 16#006D#, 16#006F#, 16#0076#, 16#0065#, 16#0064#, 16#0020#, 16#0062#, 16#0065#, 16#0066#, 16#006F#, 16#0072#, 16#0065#, 16#0020#, 16#0061#, 16#0064#, 16#0064#, 16#0069#, 16#006E#, 16#0067#, 16#0020#, 16#0074#, 16#0068#, 16#0065#, 16#0020#, 16#006E#, 16#0065#, 16#0077#, 16#0020#, 16#0063#, 16#006C#, 16#0061#, 16#0073#, 16#0073#, 16#0069#, 16#0066#, 16#0069#, 16#0065#, 16#0072#, 16#0073#, 16#002E#, others => 16#0000#), others => <>); -- "A_role_structuredClassifier" MS_0201 : aliased Matreshka.Internals.Strings.Shared_String := (Capacity => 31, Unused => 27, Length => 27, Value => (16#0041#, 16#005F#, 16#0072#, 16#006F#, 16#006C#, 16#0065#, 16#005F#, 16#0073#, 16#0074#, 16#0072#, 16#0075#, 16#0063#, 16#0074#, 16#0075#, 16#0072#, 16#0065#, 16#0064#, 16#0043#, 16#006C#, 16#0061#, 16#0073#, 16#0073#, 16#0069#, 16#0066#, 16#0069#, 16#0065#, 16#0072#, others => 16#0000#), others => <>); -- "extension" MS_0202 : aliased Matreshka.Internals.Strings.Shared_String := (Capacity => 15, Unused => 9, Length => 9, Value => (16#0065#, 16#0078#, 16#0074#, 16#0065#, 16#006E#, 16#0073#, 16#0069#, 16#006F#, 16#006E#, others => 16#0000#), others => <>); -- "appliedProfile" MS_0203 : aliased Matreshka.Internals.Strings.Shared_String := (Capacity => 15, Unused => 14, Length => 14, Value => (16#0061#, 16#0070#, 16#0070#, 16#006C#, 16#0069#, 16#0065#, 16#0064#, 16#0050#, 16#0072#, 16#006F#, 16#0066#, 16#0069#, 16#006C#, 16#0065#, others => 16#0000#), others => <>); -- "References the condition that must hold when the first extension point is reached for the extension to take place. If no constraint is associated with the extend relationship, the extension is unconditional." MS_0204 : aliased Matreshka.Internals.Strings.Shared_String := (Capacity => 215, Unused => 207, Length => 207, Value => (16#0052#, 16#0065#, 16#0066#, 16#0065#, 16#0072#, 16#0065#, 16#006E#, 16#0063#, 16#0065#, 16#0073#, 16#0020#, 16#0074#, 16#0068#, 16#0065#, 16#0020#, 16#0063#, 16#006F#, 16#006E#, 16#0064#, 16#0069#, 16#0074#, 16#0069#, 16#006F#, 16#006E#, 16#0020#, 16#0074#, 16#0068#, 16#0061#, 16#0074#, 16#0020#, 16#006D#, 16#0075#, 16#0073#, 16#0074#, 16#0020#, 16#0068#, 16#006F#, 16#006C#, 16#0064#, 16#0020#, 16#0077#, 16#0068#, 16#0065#, 16#006E#, 16#0020#, 16#0074#, 16#0068#, 16#0065#, 16#0020#, 16#0066#, 16#0069#, 16#0072#, 16#0073#, 16#0074#, 16#0020#, 16#0065#, 16#0078#, 16#0074#, 16#0065#, 16#006E#, 16#0073#, 16#0069#, 16#006F#, 16#006E#, 16#0020#, 16#0070#, 16#006F#, 16#0069#, 16#006E#, 16#0074#, 16#0020#, 16#0069#, 16#0073#, 16#0020#, 16#0072#, 16#0065#, 16#0061#, 16#0063#, 16#0068#, 16#0065#, 16#0064#, 16#0020#, 16#0066#, 16#006F#, 16#0072#, 16#0020#, 16#0074#, 16#0068#, 16#0065#, 16#0020#, 16#0065#, 16#0078#, 16#0074#, 16#0065#, 16#006E#, 16#0073#, 16#0069#, 16#006F#, 16#006E#, 16#0020#, 16#0074#, 16#006F#, 16#0020#, 16#0074#, 16#0061#, 16#006B#, 16#0065#, 16#0020#, 16#0070#, 16#006C#, 16#0061#, 16#0063#, 16#0065#, 16#002E#, 16#0020#, 16#0049#, 16#0066#, 16#0020#, 16#006E#, 16#006F#, 16#0020#, 16#0063#, 16#006F#, 16#006E#, 16#0073#, 16#0074#, 16#0072#, 16#0061#, 16#0069#, 16#006E#, 16#0074#, 16#0020#, 16#0069#, 16#0073#, 16#0020#, 16#0061#, 16#0073#, 16#0073#, 16#006F#, 16#0063#, 16#0069#, 16#0061#, 16#0074#, 16#0065#, 16#0064#, 16#0020#, 16#0077#, 16#0069#, 16#0074#, 16#0068#, 16#0020#, 16#0074#, 16#0068#, 16#0065#, 16#0020#, 16#0065#, 16#0078#, 16#0074#, 16#0065#, 16#006E#, 16#0064#, 16#0020#, 16#0072#, 16#0065#, 16#006C#, 16#0061#, 16#0074#, 16#0069#, 16#006F#, 16#006E#, 16#0073#, 16#0068#, 16#0069#, 16#0070#, 16#002C#, 16#0020#, 16#0074#, 16#0068#, 16#0065#, 16#0020#, 16#0065#, 16#0078#, 16#0074#, 16#0065#, 16#006E#, 16#0073#, 16#0069#, 16#006F#, 16#006E#, 16#0020#, 16#0069#, 16#0073#, 16#0020#, 16#0075#, 16#006E#, 16#0063#, 16#006F#, 16#006E#, 16#0064#, 16#0069#, 16#0074#, 16#0069#, 16#006F#, 16#006E#, 16#0061#, 16#006C#, 16#002E#, others => 16#0000#), others => <>); -- "A_entry_connectionPointReference" MS_0205 : aliased Matreshka.Internals.Strings.Shared_String := (Capacity => 39, Unused => 32, Length => 32, Value => (16#0041#, 16#005F#, 16#0065#, 16#006E#, 16#0074#, 16#0072#, 16#0079#, 16#005F#, 16#0063#, 16#006F#, 16#006E#, 16#006E#, 16#0065#, 16#0063#, 16#0074#, 16#0069#, 16#006F#, 16#006E#, 16#0050#, 16#006F#, 16#0069#, 16#006E#, 16#0074#, 16#0052#, 16#0065#, 16#0066#, 16#0065#, 16#0072#, 16#0065#, 16#006E#, 16#0063#, 16#0065#, others => 16#0000#), others => <>); -- "Structured activity node containing the node." MS_0206 : aliased Matreshka.Internals.Strings.Shared_String := (Capacity => 47, Unused => 45, Length => 45, Value => (16#0053#, 16#0074#, 16#0072#, 16#0075#, 16#0063#, 16#0074#, 16#0075#, 16#0072#, 16#0065#, 16#0064#, 16#0020#, 16#0061#, 16#0063#, 16#0074#, 16#0069#, 16#0076#, 16#0069#, 16#0074#, 16#0079#, 16#0020#, 16#006E#, 16#006F#, 16#0064#, 16#0065#, 16#0020#, 16#0063#, 16#006F#, 16#006E#, 16#0074#, 16#0061#, 16#0069#, 16#006E#, 16#0069#, 16#006E#, 16#0067#, 16#0020#, 16#0074#, 16#0068#, 16#0065#, 16#0020#, 16#006E#, 16#006F#, 16#0064#, 16#0065#, 16#002E#, others => 16#0000#), others => <>); -- "The optional bindings from this element to templates." MS_0207 : aliased Matreshka.Internals.Strings.Shared_String := (Capacity => 55, Unused => 53, Length => 53, Value => (16#0054#, 16#0068#, 16#0065#, 16#0020#, 16#006F#, 16#0070#, 16#0074#, 16#0069#, 16#006F#, 16#006E#, 16#0061#, 16#006C#, 16#0020#, 16#0062#, 16#0069#, 16#006E#, 16#0064#, 16#0069#, 16#006E#, 16#0067#, 16#0073#, 16#0020#, 16#0066#, 16#0072#, 16#006F#, 16#006D#, 16#0020#, 16#0074#, 16#0068#, 16#0069#, 16#0073#, 16#0020#, 16#0065#, 16#006C#, 16#0065#, 16#006D#, 16#0065#, 16#006E#, 16#0074#, 16#0020#, 16#0074#, 16#006F#, 16#0020#, 16#0074#, 16#0065#, 16#006D#, 16#0070#, 16#006C#, 16#0061#, 16#0074#, 16#0065#, 16#0073#, 16#002E#, others => 16#0000#), others => <>); -- "References the execution specification describing the execution that is started or finished at this execution event." MS_0208 : aliased Matreshka.Internals.Strings.Shared_String := (Capacity => 119, Unused => 116, Length => 116, Value => (16#0052#, 16#0065#, 16#0066#, 16#0065#, 16#0072#, 16#0065#, 16#006E#, 16#0063#, 16#0065#, 16#0073#, 16#0020#, 16#0074#, 16#0068#, 16#0065#, 16#0020#, 16#0065#, 16#0078#, 16#0065#, 16#0063#, 16#0075#, 16#0074#, 16#0069#, 16#006F#, 16#006E#, 16#0020#, 16#0073#, 16#0070#, 16#0065#, 16#0063#, 16#0069#, 16#0066#, 16#0069#, 16#0063#, 16#0061#, 16#0074#, 16#0069#, 16#006F#, 16#006E#, 16#0020#, 16#0064#, 16#0065#, 16#0073#, 16#0063#, 16#0072#, 16#0069#, 16#0062#, 16#0069#, 16#006E#, 16#0067#, 16#0020#, 16#0074#, 16#0068#, 16#0065#, 16#0020#, 16#0065#, 16#0078#, 16#0065#, 16#0063#, 16#0075#, 16#0074#, 16#0069#, 16#006F#, 16#006E#, 16#0020#, 16#0074#, 16#0068#, 16#0061#, 16#0074#, 16#0020#, 16#0069#, 16#0073#, 16#0020#, 16#0073#, 16#0074#, 16#0061#, 16#0072#, 16#0074#, 16#0065#, 16#0064#, 16#0020#, 16#006F#, 16#0072#, 16#0020#, 16#0066#, 16#0069#, 16#006E#, 16#0069#, 16#0073#, 16#0068#, 16#0065#, 16#0064#, 16#0020#, 16#0061#, 16#0074#, 16#0020#, 16#0074#, 16#0068#, 16#0069#, 16#0073#, 16#0020#, 16#0065#, 16#0078#, 16#0065#, 16#0063#, 16#0075#, 16#0074#, 16#0069#, 16#006F#, 16#006E#, 16#0020#, 16#0065#, 16#0076#, 16#0065#, 16#006E#, 16#0074#, 16#002E#, others => 16#0000#), others => <>); -- "Attribute representing the qualifier for which the value is to be specified." MS_0209 : aliased Matreshka.Internals.Strings.Shared_String := (Capacity => 79, Unused => 76, Length => 76, Value => (16#0041#, 16#0074#, 16#0074#, 16#0072#, 16#0069#, 16#0062#, 16#0075#, 16#0074#, 16#0065#, 16#0020#, 16#0072#, 16#0065#, 16#0070#, 16#0072#, 16#0065#, 16#0073#, 16#0065#, 16#006E#, 16#0074#, 16#0069#, 16#006E#, 16#0067#, 16#0020#, 16#0074#, 16#0068#, 16#0065#, 16#0020#, 16#0071#, 16#0075#, 16#0061#, 16#006C#, 16#0069#, 16#0066#, 16#0069#, 16#0065#, 16#0072#, 16#0020#, 16#0066#, 16#006F#, 16#0072#, 16#0020#, 16#0077#, 16#0068#, 16#0069#, 16#0063#, 16#0068#, 16#0020#, 16#0074#, 16#0068#, 16#0065#, 16#0020#, 16#0076#, 16#0061#, 16#006C#, 16#0075#, 16#0065#, 16#0020#, 16#0069#, 16#0073#, 16#0020#, 16#0074#, 16#006F#, 16#0020#, 16#0062#, 16#0065#, 16#0020#, 16#0073#, 16#0070#, 16#0065#, 16#0063#, 16#0069#, 16#0066#, 16#0069#, 16#0065#, 16#0064#, 16#002E#, others => 16#0000#), others => <>); -- "Specifies the behavior in one or more languages." MS_020A : aliased Matreshka.Internals.Strings.Shared_String := (Capacity => 55, Unused => 48, Length => 48, Value => (16#0053#, 16#0070#, 16#0065#, 16#0063#, 16#0069#, 16#0066#, 16#0069#, 16#0065#, 16#0073#, 16#0020#, 16#0074#, 16#0068#, 16#0065#, 16#0020#, 16#0062#, 16#0065#, 16#0068#, 16#0061#, 16#0076#, 16#0069#, 16#006F#, 16#0072#, 16#0020#, 16#0069#, 16#006E#, 16#0020#, 16#006F#, 16#006E#, 16#0065#, 16#0020#, 16#006F#, 16#0072#, 16#0020#, 16#006D#, 16#006F#, 16#0072#, 16#0065#, 16#0020#, 16#006C#, 16#0061#, 16#006E#, 16#0067#, 16#0075#, 16#0061#, 16#0067#, 16#0065#, 16#0073#, 16#002E#, others => 16#0000#), others => <>); -- "InterruptibleActivityRegion" MS_020B : aliased Matreshka.Internals.Strings.Shared_String := (Capacity => 31, Unused => 27, Length => 27, Value => (16#0049#, 16#006E#, 16#0074#, 16#0065#, 16#0072#, 16#0072#, 16#0075#, 16#0070#, 16#0074#, 16#0069#, 16#0062#, 16#006C#, 16#0065#, 16#0041#, 16#0063#, 16#0074#, 16#0069#, 16#0076#, 16#0069#, 16#0074#, 16#0079#, 16#0052#, 16#0065#, 16#0067#, 16#0069#, 16#006F#, 16#006E#, others => 16#0000#), others => <>); -- "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." MS_020C : aliased Matreshka.Internals.Strings.Shared_String := (Capacity => 151, Unused => 144, Length => 144, Value => (16#004E#, 16#006F#, 16#0074#, 16#0065#, 16#0020#, 16#0074#, 16#0068#, 16#0061#, 16#0074#, 16#0020#, 16#0074#, 16#0068#, 16#0065#, 16#0072#, 16#0065#, 16#0020#, 16#006D#, 16#0061#, 16#0079#, 16#0020#, 16#0062#, 16#0065#, 16#0020#, 16#006D#, 16#0065#, 16#006D#, 16#0062#, 16#0065#, 16#0072#, 16#0073#, 16#0020#, 16#006F#, 16#0066#, 16#0020#, 16#0074#, 16#0068#, 16#0065#, 16#0020#, 16#0043#, 16#006C#, 16#0061#, 16#0073#, 16#0073#, 16#0069#, 16#0066#, 16#0069#, 16#0065#, 16#0072#, 16#0020#, 16#0074#, 16#0068#, 16#0061#, 16#0074#, 16#0020#, 16#0061#, 16#0072#, 16#0065#, 16#0020#, 16#006F#, 16#0066#, 16#0020#, 16#0074#, 16#0068#, 16#0065#, 16#0020#, 16#0074#, 16#0079#, 16#0070#, 16#0065#, 16#0020#, 16#0046#, 16#0065#, 16#0061#, 16#0074#, 16#0075#, 16#0072#, 16#0065#, 16#0020#, 16#0062#, 16#0075#, 16#0074#, 16#0020#, 16#0061#, 16#0072#, 16#0065#, 16#0020#, 16#006E#, 16#006F#, 16#0074#, 16#0020#, 16#0069#, 16#006E#, 16#0063#, 16#006C#, 16#0075#, 16#0064#, 16#0065#, 16#0064#, 16#0020#, 16#0069#, 16#006E#, 16#0020#, 16#0074#, 16#0068#, 16#0069#, 16#0073#, 16#0020#, 16#0061#, 16#0073#, 16#0073#, 16#006F#, 16#0063#, 16#0069#, 16#0061#, 16#0074#, 16#0069#, 16#006F#, 16#006E#, 16#002C#, 16#0020#, 16#0065#, 16#002E#, 16#0067#, 16#002E#, 16#0020#, 16#0069#, 16#006E#, 16#0068#, 16#0065#, 16#0072#, 16#0069#, 16#0074#, 16#0065#, 16#0064#, 16#0020#, 16#0066#, 16#0065#, 16#0061#, 16#0074#, 16#0075#, 16#0072#, 16#0065#, 16#0073#, 16#002E#, others => 16#0000#), others => <>); -- "An artifact is the source of a deployment to a node." MS_020D : aliased Matreshka.Internals.Strings.Shared_String := (Capacity => 55, Unused => 52, Length => 52, Value => (16#0041#, 16#006E#, 16#0020#, 16#0061#, 16#0072#, 16#0074#, 16#0069#, 16#0066#, 16#0061#, 16#0063#, 16#0074#, 16#0020#, 16#0069#, 16#0073#, 16#0020#, 16#0074#, 16#0068#, 16#0065#, 16#0020#, 16#0073#, 16#006F#, 16#0075#, 16#0072#, 16#0063#, 16#0065#, 16#0020#, 16#006F#, 16#0066#, 16#0020#, 16#0061#, 16#0020#, 16#0064#, 16#0065#, 16#0070#, 16#006C#, 16#006F#, 16#0079#, 16#006D#, 16#0065#, 16#006E#, 16#0074#, 16#0020#, 16#0074#, 16#006F#, 16#0020#, 16#0061#, 16#0020#, 16#006E#, 16#006F#, 16#0064#, 16#0065#, 16#002E#, others => 16#0000#), others => <>); -- "type_of_qualifier" MS_020E : aliased Matreshka.Internals.Strings.Shared_String := (Capacity => 23, Unused => 17, Length => 17, Value => (16#0074#, 16#0079#, 16#0070#, 16#0065#, 16#005F#, 16#006F#, 16#0066#, 16#005F#, 16#0071#, 16#0075#, 16#0061#, 16#006C#, 16#0069#, 16#0066#, 16#0069#, 16#0065#, 16#0072#, others => 16#0000#), others => <>); -- "Specifies the position of an existing link to be destroyed in ordered nonunique association ends. The type of the pin is UnlimitedNatural, but the value cannot be zero or unlimited." MS_020F : aliased Matreshka.Internals.Strings.Shared_String := (Capacity => 191, Unused => 181, Length => 181, Value => (16#0053#, 16#0070#, 16#0065#, 16#0063#, 16#0069#, 16#0066#, 16#0069#, 16#0065#, 16#0073#, 16#0020#, 16#0074#, 16#0068#, 16#0065#, 16#0020#, 16#0070#, 16#006F#, 16#0073#, 16#0069#, 16#0074#, 16#0069#, 16#006F#, 16#006E#, 16#0020#, 16#006F#, 16#0066#, 16#0020#, 16#0061#, 16#006E#, 16#0020#, 16#0065#, 16#0078#, 16#0069#, 16#0073#, 16#0074#, 16#0069#, 16#006E#, 16#0067#, 16#0020#, 16#006C#, 16#0069#, 16#006E#, 16#006B#, 16#0020#, 16#0074#, 16#006F#, 16#0020#, 16#0062#, 16#0065#, 16#0020#, 16#0064#, 16#0065#, 16#0073#, 16#0074#, 16#0072#, 16#006F#, 16#0079#, 16#0065#, 16#0064#, 16#0020#, 16#0069#, 16#006E#, 16#0020#, 16#006F#, 16#0072#, 16#0064#, 16#0065#, 16#0072#, 16#0065#, 16#0064#, 16#0020#, 16#006E#, 16#006F#, 16#006E#, 16#0075#, 16#006E#, 16#0069#, 16#0071#, 16#0075#, 16#0065#, 16#0020#, 16#0061#, 16#0073#, 16#0073#, 16#006F#, 16#0063#, 16#0069#, 16#0061#, 16#0074#, 16#0069#, 16#006F#, 16#006E#, 16#0020#, 16#0065#, 16#006E#, 16#0064#, 16#0073#, 16#002E#, 16#0020#, 16#0054#, 16#0068#, 16#0065#, 16#0020#, 16#0074#, 16#0079#, 16#0070#, 16#0065#, 16#0020#, 16#006F#, 16#0066#, 16#0020#, 16#0074#, 16#0068#, 16#0065#, 16#0020#, 16#0070#, 16#0069#, 16#006E#, 16#0020#, 16#0069#, 16#0073#, 16#0020#, 16#0055#, 16#006E#, 16#006C#, 16#0069#, 16#006D#, 16#0069#, 16#0074#, 16#0065#, 16#0064#, 16#004E#, 16#0061#, 16#0074#, 16#0075#, 16#0072#, 16#0061#, 16#006C#, 16#002C#, 16#0020#, 16#0062#, 16#0075#, 16#0074#, 16#0020#, 16#0074#, 16#0068#, 16#0065#, 16#0020#, 16#0076#, 16#0061#, 16#006C#, 16#0075#, 16#0065#, 16#0020#, 16#0063#, 16#0061#, 16#006E#, 16#006E#, 16#006F#, 16#0074#, 16#0020#, 16#0062#, 16#0065#, 16#0020#, 16#007A#, 16#0065#, 16#0072#, 16#006F#, 16#0020#, 16#006F#, 16#0072#, 16#0020#, 16#0075#, 16#006E#, 16#006C#, 16#0069#, 16#006D#, 16#0069#, 16#0074#, 16#0065#, 16#0064#, 16#002E#, others => 16#0000#), others => <>); -- "References the InteractionFragments in which this Lifeline takes part." MS_0210 : aliased Matreshka.Internals.Strings.Shared_String := (Capacity => 79, Unused => 70, Length => 70, Value => (16#0052#, 16#0065#, 16#0066#, 16#0065#, 16#0072#, 16#0065#, 16#006E#, 16#0063#, 16#0065#, 16#0073#, 16#0020#, 16#0074#, 16#0068#, 16#0065#, 16#0020#, 16#0049#, 16#006E#, 16#0074#, 16#0065#, 16#0072#, 16#0061#, 16#0063#, 16#0074#, 16#0069#, 16#006F#, 16#006E#, 16#0046#, 16#0072#, 16#0061#, 16#0067#, 16#006D#, 16#0065#, 16#006E#, 16#0074#, 16#0073#, 16#0020#, 16#0069#, 16#006E#, 16#0020#, 16#0077#, 16#0068#, 16#0069#, 16#0063#, 16#0068#, 16#0020#, 16#0074#, 16#0068#, 16#0069#, 16#0073#, 16#0020#, 16#004C#, 16#0069#, 16#0066#, 16#0065#, 16#006C#, 16#0069#, 16#006E#, 16#0065#, 16#0020#, 16#0074#, 16#0061#, 16#006B#, 16#0065#, 16#0073#, 16#0020#, 16#0070#, 16#0061#, 16#0072#, 16#0074#, 16#002E#, others => 16#0000#), others => <>); -- "Denotes a set of connector ends that attaches to this connectable element." MS_0211 : aliased Matreshka.Internals.Strings.Shared_String := (Capacity => 79, Unused => 74, Length => 74, Value => (16#0044#, 16#0065#, 16#006E#, 16#006F#, 16#0074#, 16#0065#, 16#0073#, 16#0020#, 16#0061#, 16#0020#, 16#0073#, 16#0065#, 16#0074#, 16#0020#, 16#006F#, 16#0066#, 16#0020#, 16#0063#, 16#006F#, 16#006E#, 16#006E#, 16#0065#, 16#0063#, 16#0074#, 16#006F#, 16#0072#, 16#0020#, 16#0065#, 16#006E#, 16#0064#, 16#0073#, 16#0020#, 16#0074#, 16#0068#, 16#0061#, 16#0074#, 16#0020#, 16#0061#, 16#0074#, 16#0074#, 16#0061#, 16#0063#, 16#0068#, 16#0065#, 16#0073#, 16#0020#, 16#0074#, 16#006F#, 16#0020#, 16#0074#, 16#0068#, 16#0069#, 16#0073#, 16#0020#, 16#0063#, 16#006F#, 16#006E#, 16#006E#, 16#0065#, 16#0063#, 16#0074#, 16#0061#, 16#0062#, 16#006C#, 16#0065#, 16#0020#, 16#0065#, 16#006C#, 16#0065#, 16#006D#, 16#0065#, 16#006E#, 16#0074#, 16#002E#, others => 16#0000#), others => <>); -- "Takes output from the action." MS_0212 : aliased Matreshka.Internals.Strings.Shared_String := (Capacity => 31, Unused => 29, Length => 29, Value => (16#0054#, 16#0061#, 16#006B#, 16#0065#, 16#0073#, 16#0020#, 16#006F#, 16#0075#, 16#0074#, 16#0070#, 16#0075#, 16#0074#, 16#0020#, 16#0066#, 16#0072#, 16#006F#, 16#006D#, 16#0020#, 16#0074#, 16#0068#, 16#0065#, 16#0020#, 16#0061#, 16#0063#, 16#0074#, 16#0069#, 16#006F#, 16#006E#, 16#002E#, others => 16#0000#), others => <>); -- "References the Class that owns the Property." MS_0213 : aliased Matreshka.Internals.Strings.Shared_String := (Capacity => 47, Unused => 44, Length => 44, Value => (16#0052#, 16#0065#, 16#0066#, 16#0065#, 16#0072#, 16#0065#, 16#006E#, 16#0063#, 16#0065#, 16#0073#, 16#00A0#, 16#0074#, 16#0068#, 16#0065#, 16#00A0#, 16#0043#, 16#006C#, 16#0061#, 16#0073#, 16#0073#, 16#00A0#, 16#0074#, 16#0068#, 16#0061#, 16#0074#, 16#00A0#, 16#006F#, 16#0077#, 16#006E#, 16#0073#, 16#00A0#, 16#0074#, 16#0068#, 16#0065#, 16#00A0#, 16#0050#, 16#0072#, 16#006F#, 16#0070#, 16#0065#, 16#0072#, 16#0074#, 16#0079#, 16#002E#, others => 16#0000#), others => <>); -- "The ParameterSets owned by this BehavioralFeature." MS_0214 : aliased Matreshka.Internals.Strings.Shared_String := (Capacity => 55, Unused => 50, Length => 50, Value => (16#0054#, 16#0068#, 16#0065#, 16#0020#, 16#0050#, 16#0061#, 16#0072#, 16#0061#, 16#006D#, 16#0065#, 16#0074#, 16#0065#, 16#0072#, 16#0053#, 16#0065#, 16#0074#, 16#0073#, 16#0020#, 16#006F#, 16#0077#, 16#006E#, 16#0065#, 16#0064#, 16#0020#, 16#0062#, 16#0079#, 16#0020#, 16#0074#, 16#0068#, 16#0069#, 16#0073#, 16#0020#, 16#0042#, 16#0065#, 16#0068#, 16#0061#, 16#0076#, 16#0069#, 16#006F#, 16#0072#, 16#0061#, 16#006C#, 16#0046#, 16#0065#, 16#0061#, 16#0074#, 16#0075#, 16#0072#, 16#0065#, 16#002E#, others => 16#0000#), others => <>); -- "If an object node has a selection behavior, then the ordering of the object node is ordered, and vice versa." MS_0215 : aliased Matreshka.Internals.Strings.Shared_String := (Capacity => 111, Unused => 108, Length => 108, Value => (16#0049#, 16#0066#, 16#0020#, 16#0061#, 16#006E#, 16#0020#, 16#006F#, 16#0062#, 16#006A#, 16#0065#, 16#0063#, 16#0074#, 16#0020#, 16#006E#, 16#006F#, 16#0064#, 16#0065#, 16#0020#, 16#0068#, 16#0061#, 16#0073#, 16#0020#, 16#0061#, 16#0020#, 16#0073#, 16#0065#, 16#006C#, 16#0065#, 16#0063#, 16#0074#, 16#0069#, 16#006F#, 16#006E#, 16#0020#, 16#0062#, 16#0065#, 16#0068#, 16#0061#, 16#0076#, 16#0069#, 16#006F#, 16#0072#, 16#002C#, 16#0020#, 16#0074#, 16#0068#, 16#0065#, 16#006E#, 16#0020#, 16#0074#, 16#0068#, 16#0065#, 16#0020#, 16#006F#, 16#0072#, 16#0064#, 16#0065#, 16#0072#, 16#0069#, 16#006E#, 16#0067#, 16#0020#, 16#006F#, 16#0066#, 16#0020#, 16#0074#, 16#0068#, 16#0065#, 16#0020#, 16#006F#, 16#0062#, 16#006A#, 16#0065#, 16#0063#, 16#0074#, 16#0020#, 16#006E#, 16#006F#, 16#0064#, 16#0065#, 16#0020#, 16#0069#, 16#0073#, 16#0020#, 16#006F#, 16#0072#, 16#0064#, 16#0065#, 16#0072#, 16#0065#, 16#0064#, 16#002C#, 16#0020#, 16#0061#, 16#006E#, 16#0064#, 16#0020#, 16#0076#, 16#0069#, 16#0063#, 16#0065#, 16#0020#, 16#0076#, 16#0065#, 16#0072#, 16#0073#, 16#0061#, 16#002E#, others => 16#0000#), others => <>); -- "A connectable element template parameter exposes a connectable element as a formal parameter for a template." MS_0216 : aliased Matreshka.Internals.Strings.Shared_String := (Capacity => 111, Unused => 108, Length => 108, Value => (16#0041#, 16#0020#, 16#0063#, 16#006F#, 16#006E#, 16#006E#, 16#0065#, 16#0063#, 16#0074#, 16#0061#, 16#0062#, 16#006C#, 16#0065#, 16#0020#, 16#0065#, 16#006C#, 16#0065#, 16#006D#, 16#0065#, 16#006E#, 16#0074#, 16#0020#, 16#0074#, 16#0065#, 16#006D#, 16#0070#, 16#006C#, 16#0061#, 16#0074#, 16#0065#, 16#0020#, 16#0070#, 16#0061#, 16#0072#, 16#0061#, 16#006D#, 16#0065#, 16#0074#, 16#0065#, 16#0072#, 16#0020#, 16#0065#, 16#0078#, 16#0070#, 16#006F#, 16#0073#, 16#0065#, 16#0073#, 16#0020#, 16#0061#, 16#0020#, 16#0063#, 16#006F#, 16#006E#, 16#006E#, 16#0065#, 16#0063#, 16#0074#, 16#0061#, 16#0062#, 16#006C#, 16#0065#, 16#0020#, 16#0065#, 16#006C#, 16#0065#, 16#006D#, 16#0065#, 16#006E#, 16#0074#, 16#0020#, 16#0061#, 16#0073#, 16#0020#, 16#0061#, 16#0020#, 16#0066#, 16#006F#, 16#0072#, 16#006D#, 16#0061#, 16#006C#, 16#0020#, 16#0070#, 16#0061#, 16#0072#, 16#0061#, 16#006D#, 16#0065#, 16#0074#, 16#0065#, 16#0072#, 16#0020#, 16#0066#, 16#006F#, 16#0072#, 16#0020#, 16#0061#, 16#0020#, 16#0074#, 16#0065#, 16#006D#, 16#0070#, 16#006C#, 16#0061#, 16#0074#, 16#0065#, 16#002E#, others => 16#0000#), others => <>); -- "The constraint may contain references to global data or write-once data." MS_0217 : aliased Matreshka.Internals.Strings.Shared_String := (Capacity => 79, Unused => 72, Length => 72, Value => (16#0054#, 16#0068#, 16#0065#, 16#0020#, 16#0063#, 16#006F#, 16#006E#, 16#0073#, 16#0074#, 16#0072#, 16#0061#, 16#0069#, 16#006E#, 16#0074#, 16#0020#, 16#006D#, 16#0061#, 16#0079#, 16#0020#, 16#0063#, 16#006F#, 16#006E#, 16#0074#, 16#0061#, 16#0069#, 16#006E#, 16#0020#, 16#0072#, 16#0065#, 16#0066#, 16#0065#, 16#0072#, 16#0065#, 16#006E#, 16#0063#, 16#0065#, 16#0073#, 16#0020#, 16#0074#, 16#006F#, 16#0020#, 16#0067#, 16#006C#, 16#006F#, 16#0062#, 16#0061#, 16#006C#, 16#0020#, 16#0064#, 16#0061#, 16#0074#, 16#0061#, 16#0020#, 16#006F#, 16#0072#, 16#0020#, 16#0077#, 16#0072#, 16#0069#, 16#0074#, 16#0065#, 16#002D#, 16#006F#, 16#006E#, 16#0063#, 16#0065#, 16#0020#, 16#0064#, 16#0061#, 16#0074#, 16#0061#, 16#002E#, others => 16#0000#), others => <>); -- "A_constrainedElement_constraint" MS_0218 : aliased Matreshka.Internals.Strings.Shared_String := (Capacity => 39, Unused => 31, Length => 31, Value => (16#0041#, 16#005F#, 16#0063#, 16#006F#, 16#006E#, 16#0073#, 16#0074#, 16#0072#, 16#0061#, 16#0069#, 16#006E#, 16#0065#, 16#0064#, 16#0045#, 16#006C#, 16#0065#, 16#006D#, 16#0065#, 16#006E#, 16#0074#, 16#005F#, 16#0063#, 16#006F#, 16#006E#, 16#0073#, 16#0074#, 16#0072#, 16#0061#, 16#0069#, 16#006E#, 16#0074#, others => 16#0000#), others => <>); -- "members_distinguishable" MS_0219 : aliased Matreshka.Internals.Strings.Shared_String := (Capacity => 31, Unused => 23, Length => 23, Value => (16#006D#, 16#0065#, 16#006D#, 16#0062#, 16#0065#, 16#0072#, 16#0073#, 16#005F#, 16#0064#, 16#0069#, 16#0073#, 16#0074#, 16#0069#, 16#006E#, 16#0067#, 16#0075#, 16#0069#, 16#0073#, 16#0068#, 16#0061#, 16#0062#, 16#006C#, 16#0065#, others => 16#0000#), others => <>); -- "Reception" MS_021A : aliased Matreshka.Internals.Strings.Shared_String := (Capacity => 15, Unused => 9, Length => 9, Value => (16#0052#, 16#0065#, 16#0063#, 16#0065#, 16#0070#, 16#0074#, 16#0069#, 16#006F#, 16#006E#, others => 16#0000#), others => <>); -- "A_classifier_enumerationLiteral" MS_021B : aliased Matreshka.Internals.Strings.Shared_String := (Capacity => 39, Unused => 31, Length => 31, Value => (16#0041#, 16#005F#, 16#0063#, 16#006C#, 16#0061#, 16#0073#, 16#0073#, 16#0069#, 16#0066#, 16#0069#, 16#0065#, 16#0072#, 16#005F#, 16#0065#, 16#006E#, 16#0075#, 16#006D#, 16#0065#, 16#0072#, 16#0061#, 16#0074#, 16#0069#, 16#006F#, 16#006E#, 16#004C#, 16#0069#, 16#0074#, 16#0065#, 16#0072#, 16#0061#, 16#006C#, others => 16#0000#), others => <>); -- "isUnmrashall must be true for an AcceptCallAction." MS_021C : aliased Matreshka.Internals.Strings.Shared_String := (Capacity => 55, Unused => 50, Length => 50, Value => (16#0069#, 16#0073#, 16#0055#, 16#006E#, 16#006D#, 16#0072#, 16#0061#, 16#0073#, 16#0068#, 16#0061#, 16#006C#, 16#006C#, 16#0020#, 16#006D#, 16#0075#, 16#0073#, 16#0074#, 16#0020#, 16#0062#, 16#0065#, 16#0020#, 16#0074#, 16#0072#, 16#0075#, 16#0065#, 16#0020#, 16#0066#, 16#006F#, 16#0072#, 16#0020#, 16#0061#, 16#006E#, 16#0020#, 16#0041#, 16#0063#, 16#0063#, 16#0065#, 16#0070#, 16#0074#, 16#0043#, 16#0061#, 16#006C#, 16#006C#, 16#0041#, 16#0063#, 16#0074#, 16#0069#, 16#006F#, 16#006E#, 16#002E#, others => 16#0000#), others => <>); -- "isDirect" MS_021D : aliased Matreshka.Internals.Strings.Shared_String := (Capacity => 15, Unused => 8, Length => 8, Value => (16#0069#, 16#0073#, 16#0044#, 16#0069#, 16#0072#, 16#0065#, 16#0063#, 16#0074#, others => 16#0000#), others => <>); -- "type_target_pin" MS_021E : aliased Matreshka.Internals.Strings.Shared_String := (Capacity => 23, Unused => 15, Length => 15, Value => (16#0074#, 16#0079#, 16#0070#, 16#0065#, 16#005F#, 16#0074#, 16#0061#, 16#0072#, 16#0067#, 16#0065#, 16#0074#, 16#005F#, 16#0070#, 16#0069#, 16#006E#, others => 16#0000#), others => <>); -- "namedElement" MS_021F : aliased Matreshka.Internals.Strings.Shared_String := (Capacity => 15, Unused => 12, Length => 12, Value => (16#006E#, 16#0061#, 16#006D#, 16#0065#, 16#0064#, 16#0045#, 16#006C#, 16#0065#, 16#006D#, 16#0065#, 16#006E#, 16#0074#, others => 16#0000#), others => <>); -- "templateBinding" MS_0220 : aliased Matreshka.Internals.Strings.Shared_String := (Capacity => 23, Unused => 15, Length => 15, Value => (16#0074#, 16#0065#, 16#006D#, 16#0070#, 16#006C#, 16#0061#, 16#0074#, 16#0065#, 16#0042#, 16#0069#, 16#006E#, 16#0064#, 16#0069#, 16#006E#, 16#0067#, others => 16#0000#), others => <>); -- "Specifies the languages in which the expression is stated. The interpretation of the expression body depends on the languages. If the languages are unspecified, they might be implicit from the expression body or the context. Languages are matched to body strings by order." MS_0221 : aliased Matreshka.Internals.Strings.Shared_String := (Capacity => 287, Unused => 272, Length => 272, Value => (16#0053#, 16#0070#, 16#0065#, 16#0063#, 16#0069#, 16#0066#, 16#0069#, 16#0065#, 16#0073#, 16#0020#, 16#0074#, 16#0068#, 16#0065#, 16#0020#, 16#006C#, 16#0061#, 16#006E#, 16#0067#, 16#0075#, 16#0061#, 16#0067#, 16#0065#, 16#0073#, 16#0020#, 16#0069#, 16#006E#, 16#0020#, 16#0077#, 16#0068#, 16#0069#, 16#0063#, 16#0068#, 16#0020#, 16#0074#, 16#0068#, 16#0065#, 16#0020#, 16#0065#, 16#0078#, 16#0070#, 16#0072#, 16#0065#, 16#0073#, 16#0073#, 16#0069#, 16#006F#, 16#006E#, 16#0020#, 16#0069#, 16#0073#, 16#0020#, 16#0073#, 16#0074#, 16#0061#, 16#0074#, 16#0065#, 16#0064#, 16#002E#, 16#0020#, 16#0054#, 16#0068#, 16#0065#, 16#0020#, 16#0069#, 16#006E#, 16#0074#, 16#0065#, 16#0072#, 16#0070#, 16#0072#, 16#0065#, 16#0074#, 16#0061#, 16#0074#, 16#0069#, 16#006F#, 16#006E#, 16#0020#, 16#006F#, 16#0066#, 16#0020#, 16#0074#, 16#0068#, 16#0065#, 16#0020#, 16#0065#, 16#0078#, 16#0070#, 16#0072#, 16#0065#, 16#0073#, 16#0073#, 16#0069#, 16#006F#, 16#006E#, 16#0020#, 16#0062#, 16#006F#, 16#0064#, 16#0079#, 16#0020#, 16#0064#, 16#0065#, 16#0070#, 16#0065#, 16#006E#, 16#0064#, 16#0073#, 16#0020#, 16#006F#, 16#006E#, 16#0020#, 16#0074#, 16#0068#, 16#0065#, 16#0020#, 16#006C#, 16#0061#, 16#006E#, 16#0067#, 16#0075#, 16#0061#, 16#0067#, 16#0065#, 16#0073#, 16#002E#, 16#0020#, 16#0049#, 16#0066#, 16#0020#, 16#0074#, 16#0068#, 16#0065#, 16#0020#, 16#006C#, 16#0061#, 16#006E#, 16#0067#, 16#0075#, 16#0061#, 16#0067#, 16#0065#, 16#0073#, 16#0020#, 16#0061#, 16#0072#, 16#0065#, 16#0020#, 16#0075#, 16#006E#, 16#0073#, 16#0070#, 16#0065#, 16#0063#, 16#0069#, 16#0066#, 16#0069#, 16#0065#, 16#0064#, 16#002C#, 16#0020#, 16#0074#, 16#0068#, 16#0065#, 16#0079#, 16#0020#, 16#006D#, 16#0069#, 16#0067#, 16#0068#, 16#0074#, 16#0020#, 16#0062#, 16#0065#, 16#0020#, 16#0069#, 16#006D#, 16#0070#, 16#006C#, 16#0069#, 16#0063#, 16#0069#, 16#0074#, 16#0020#, 16#0066#, 16#0072#, 16#006F#, 16#006D#, 16#0020#, 16#0074#, 16#0068#, 16#0065#, 16#0020#, 16#0065#, 16#0078#, 16#0070#, 16#0072#, 16#0065#, 16#0073#, 16#0073#, 16#0069#, 16#006F#, 16#006E#, 16#0020#, 16#0062#, 16#006F#, 16#0064#, 16#0079#, 16#0020#, 16#006F#, 16#0072#, 16#0020#, 16#0074#, 16#0068#, 16#0065#, 16#0020#, 16#0063#, 16#006F#, 16#006E#, 16#0074#, 16#0065#, 16#0078#, 16#0074#, 16#002E#, 16#0020#, 16#004C#, 16#0061#, 16#006E#, 16#0067#, 16#0075#, 16#0061#, 16#0067#, 16#0065#, 16#0073#, 16#0020#, 16#0061#, 16#0072#, 16#0065#, 16#0020#, 16#006D#, 16#0061#, 16#0074#, 16#0063#, 16#0068#, 16#0065#, 16#0064#, 16#0020#, 16#0074#, 16#006F#, 16#0020#, 16#0062#, 16#006F#, 16#0064#, 16#0079#, 16#0020#, 16#0073#, 16#0074#, 16#0072#, 16#0069#, 16#006E#, 16#0067#, 16#0073#, 16#0020#, 16#0062#, 16#0079#, 16#0020#, 16#006F#, 16#0072#, 16#0064#, 16#0065#, 16#0072#, 16#002E#, others => 16#0000#), others => <>); -- "number_of_result" MS_0222 : aliased Matreshka.Internals.Strings.Shared_String := (Capacity => 23, Unused => 16, Length => 16, Value => (16#006E#, 16#0075#, 16#006D#, 16#0062#, 16#0065#, 16#0072#, 16#005F#, 16#006F#, 16#0066#, 16#005F#, 16#0072#, 16#0065#, 16#0073#, 16#0075#, 16#006C#, 16#0074#, others => 16#0000#), others => <>); -- "References the interfaces specifying the set of operations and receptions that the classifier offers to its environment via this port, and which it will handle either directly or by forwarding it to a part of its internal structure. This association is derived according to the value of isConjugated. If isConjugated is false, provided is derived as the union of the sets of interfaces realized by the type of the port and its supertypes, or directly from the type of the port if the port is typed by an interface. If isConjugated is true, it is derived as the union of the sets of interfaces used by the type of the port and its supertypes." MS_0223 : aliased Matreshka.Internals.Strings.Shared_String := (Capacity => 663, Unused => 641, Length => 641, Value => (16#0052#, 16#0065#, 16#0066#, 16#0065#, 16#0072#, 16#0065#, 16#006E#, 16#0063#, 16#0065#, 16#0073#, 16#0020#, 16#0074#, 16#0068#, 16#0065#, 16#0020#, 16#0069#, 16#006E#, 16#0074#, 16#0065#, 16#0072#, 16#0066#, 16#0061#, 16#0063#, 16#0065#, 16#0073#, 16#0020#, 16#0073#, 16#0070#, 16#0065#, 16#0063#, 16#0069#, 16#0066#, 16#0079#, 16#0069#, 16#006E#, 16#0067#, 16#0020#, 16#0074#, 16#0068#, 16#0065#, 16#0020#, 16#0073#, 16#0065#, 16#0074#, 16#0020#, 16#006F#, 16#0066#, 16#0020#, 16#006F#, 16#0070#, 16#0065#, 16#0072#, 16#0061#, 16#0074#, 16#0069#, 16#006F#, 16#006E#, 16#0073#, 16#0020#, 16#0061#, 16#006E#, 16#0064#, 16#0020#, 16#0072#, 16#0065#, 16#0063#, 16#0065#, 16#0070#, 16#0074#, 16#0069#, 16#006F#, 16#006E#, 16#0073#, 16#0020#, 16#0074#, 16#0068#, 16#0061#, 16#0074#, 16#0020#, 16#0074#, 16#0068#, 16#0065#, 16#0020#, 16#0063#, 16#006C#, 16#0061#, 16#0073#, 16#0073#, 16#0069#, 16#0066#, 16#0069#, 16#0065#, 16#0072#, 16#0020#, 16#006F#, 16#0066#, 16#0066#, 16#0065#, 16#0072#, 16#0073#, 16#0020#, 16#0074#, 16#006F#, 16#0020#, 16#0069#, 16#0074#, 16#0073#, 16#0020#, 16#0065#, 16#006E#, 16#0076#, 16#0069#, 16#0072#, 16#006F#, 16#006E#, 16#006D#, 16#0065#, 16#006E#, 16#0074#, 16#0020#, 16#0076#, 16#0069#, 16#0061#, 16#0020#, 16#0074#, 16#0068#, 16#0069#, 16#0073#, 16#0020#, 16#0070#, 16#006F#, 16#0072#, 16#0074#, 16#002C#, 16#0020#, 16#0061#, 16#006E#, 16#0064#, 16#0020#, 16#0077#, 16#0068#, 16#0069#, 16#0063#, 16#0068#, 16#0020#, 16#0069#, 16#0074#, 16#0020#, 16#0077#, 16#0069#, 16#006C#, 16#006C#, 16#0020#, 16#0068#, 16#0061#, 16#006E#, 16#0064#, 16#006C#, 16#0065#, 16#0020#, 16#0065#, 16#0069#, 16#0074#, 16#0068#, 16#0065#, 16#0072#, 16#0020#, 16#0064#, 16#0069#, 16#0072#, 16#0065#, 16#0063#, 16#0074#, 16#006C#, 16#0079#, 16#0020#, 16#006F#, 16#0072#, 16#0020#, 16#0062#, 16#0079#, 16#0020#, 16#0066#, 16#006F#, 16#0072#, 16#0077#, 16#0061#, 16#0072#, 16#0064#, 16#0069#, 16#006E#, 16#0067#, 16#0020#, 16#0069#, 16#0074#, 16#0020#, 16#0074#, 16#006F#, 16#0020#, 16#0061#, 16#0020#, 16#0070#, 16#0061#, 16#0072#, 16#0074#, 16#0020#, 16#006F#, 16#0066#, 16#0020#, 16#0069#, 16#0074#, 16#0073#, 16#0020#, 16#0069#, 16#006E#, 16#0074#, 16#0065#, 16#0072#, 16#006E#, 16#0061#, 16#006C#, 16#0020#, 16#0073#, 16#0074#, 16#0072#, 16#0075#, 16#0063#, 16#0074#, 16#0075#, 16#0072#, 16#0065#, 16#002E#, 16#0020#, 16#0054#, 16#0068#, 16#0069#, 16#0073#, 16#0020#, 16#0061#, 16#0073#, 16#0073#, 16#006F#, 16#0063#, 16#0069#, 16#0061#, 16#0074#, 16#0069#, 16#006F#, 16#006E#, 16#0020#, 16#0069#, 16#0073#, 16#0020#, 16#0064#, 16#0065#, 16#0072#, 16#0069#, 16#0076#, 16#0065#, 16#0064#, 16#0020#, 16#0061#, 16#0063#, 16#0063#, 16#006F#, 16#0072#, 16#0064#, 16#0069#, 16#006E#, 16#0067#, 16#0020#, 16#0074#, 16#006F#, 16#0020#, 16#0074#, 16#0068#, 16#0065#, 16#0020#, 16#0076#, 16#0061#, 16#006C#, 16#0075#, 16#0065#, 16#0020#, 16#006F#, 16#0066#, 16#0020#, 16#0069#, 16#0073#, 16#0043#, 16#006F#, 16#006E#, 16#006A#, 16#0075#, 16#0067#, 16#0061#, 16#0074#, 16#0065#, 16#0064#, 16#002E#, 16#0020#, 16#0049#, 16#0066#, 16#0020#, 16#0069#, 16#0073#, 16#0043#, 16#006F#, 16#006E#, 16#006A#, 16#0075#, 16#0067#, 16#0061#, 16#0074#, 16#0065#, 16#0064#, 16#0020#, 16#0069#, 16#0073#, 16#0020#, 16#0066#, 16#0061#, 16#006C#, 16#0073#, 16#0065#, 16#002C#, 16#0020#, 16#0070#, 16#0072#, 16#006F#, 16#0076#, 16#0069#, 16#0064#, 16#0065#, 16#0064#, 16#0020#, 16#0069#, 16#0073#, 16#0020#, 16#0064#, 16#0065#, 16#0072#, 16#0069#, 16#0076#, 16#0065#, 16#0064#, 16#0020#, 16#0061#, 16#0073#, 16#0020#, 16#0074#, 16#0068#, 16#0065#, 16#0020#, 16#0075#, 16#006E#, 16#0069#, 16#006F#, 16#006E#, 16#0020#, 16#006F#, 16#0066#, 16#0020#, 16#0074#, 16#0068#, 16#0065#, 16#0020#, 16#0073#, 16#0065#, 16#0074#, 16#0073#, 16#0020#, 16#006F#, 16#0066#, 16#0020#, 16#0069#, 16#006E#, 16#0074#, 16#0065#, 16#0072#, 16#0066#, 16#0061#, 16#0063#, 16#0065#, 16#0073#, 16#0020#, 16#0072#, 16#0065#, 16#0061#, 16#006C#, 16#0069#, 16#007A#, 16#0065#, 16#0064#, 16#0020#, 16#0062#, 16#0079#, 16#0020#, 16#0074#, 16#0068#, 16#0065#, 16#0020#, 16#0074#, 16#0079#, 16#0070#, 16#0065#, 16#0020#, 16#006F#, 16#0066#, 16#0020#, 16#0074#, 16#0068#, 16#0065#, 16#0020#, 16#0070#, 16#006F#, 16#0072#, 16#0074#, 16#0020#, 16#0061#, 16#006E#, 16#0064#, 16#0020#, 16#0069#, 16#0074#, 16#0073#, 16#0020#, 16#0073#, 16#0075#, 16#0070#, 16#0065#, 16#0072#, 16#0074#, 16#0079#, 16#0070#, 16#0065#, 16#0073#, 16#002C#, 16#0020#, 16#006F#, 16#0072#, 16#0020#, 16#0064#, 16#0069#, 16#0072#, 16#0065#, 16#0063#, 16#0074#, 16#006C#, 16#0079#, 16#0020#, 16#0066#, 16#0072#, 16#006F#, 16#006D#, 16#0020#, 16#0074#, 16#0068#, 16#0065#, 16#0020#, 16#0074#, 16#0079#, 16#0070#, 16#0065#, 16#0020#, 16#006F#, 16#0066#, 16#0020#, 16#0074#, 16#0068#, 16#0065#, 16#0020#, 16#0070#, 16#006F#, 16#0072#, 16#0074#, 16#0020#, 16#0069#, 16#0066#, 16#0020#, 16#0074#, 16#0068#, 16#0065#, 16#0020#, 16#0070#, 16#006F#, 16#0072#, 16#0074#, 16#0020#, 16#0069#, 16#0073#, 16#0020#, 16#0074#, 16#0079#, 16#0070#, 16#0065#, 16#0064#, 16#0020#, 16#0062#, 16#0079#, 16#0020#, 16#0061#, 16#006E#, 16#0020#, 16#0069#, 16#006E#, 16#0074#, 16#0065#, 16#0072#, 16#0066#, 16#0061#, 16#0063#, 16#0065#, 16#002E#, 16#0020#, 16#0049#, 16#0066#, 16#0020#, 16#0069#, 16#0073#, 16#0043#, 16#006F#, 16#006E#, 16#006A#, 16#0075#, 16#0067#, 16#0061#, 16#0074#, 16#0065#, 16#0064#, 16#0020#, 16#0069#, 16#0073#, 16#0020#, 16#0074#, 16#0072#, 16#0075#, 16#0065#, 16#002C#, 16#0020#, 16#0069#, 16#0074#, 16#0020#, 16#0069#, 16#0073#, 16#0020#, 16#0064#, 16#0065#, 16#0072#, 16#0069#, 16#0076#, 16#0065#, 16#0064#, 16#0020#, 16#0061#, 16#0073#, 16#0020#, 16#0074#, 16#0068#, 16#0065#, 16#0020#, 16#0075#, 16#006E#, 16#0069#, 16#006F#, 16#006E#, 16#0020#, 16#006F#, 16#0066#, 16#0020#, 16#0074#, 16#0068#, 16#0065#, 16#0020#, 16#0073#, 16#0065#, 16#0074#, 16#0073#, 16#0020#, 16#006F#, 16#0066#, 16#0020#, 16#0069#, 16#006E#, 16#0074#, 16#0065#, 16#0072#, 16#0066#, 16#0061#, 16#0063#, 16#0065#, 16#0073#, 16#0020#, 16#0075#, 16#0073#, 16#0065#, 16#0064#, 16#0020#, 16#0062#, 16#0079#, 16#0020#, 16#0074#, 16#0068#, 16#0065#, 16#0020#, 16#0074#, 16#0079#, 16#0070#, 16#0065#, 16#0020#, 16#006F#, 16#0066#, 16#0020#, 16#0074#, 16#0068#, 16#0065#, 16#0020#, 16#0070#, 16#006F#, 16#0072#, 16#0074#, 16#0020#, 16#0061#, 16#006E#, 16#0064#, 16#0020#, 16#0069#, 16#0074#, 16#0073#, 16#0020#, 16#0073#, 16#0075#, 16#0070#, 16#0065#, 16#0072#, 16#0074#, 16#0079#, 16#0070#, 16#0065#, 16#0073#, 16#002E#, others => 16#0000#), others => <>); -- "The interactionOperator assert designates that the CombinedFragment represents an assertion. The sequences of the operand of the assertion are the only valid continuations. All other continuations result in an invalid trace." MS_0224 : aliased Matreshka.Internals.Strings.Shared_String := (Capacity => 231, Unused => 224, Length => 224, Value => (16#0054#, 16#0068#, 16#0065#, 16#0020#, 16#0069#, 16#006E#, 16#0074#, 16#0065#, 16#0072#, 16#0061#, 16#0063#, 16#0074#, 16#0069#, 16#006F#, 16#006E#, 16#004F#, 16#0070#, 16#0065#, 16#0072#, 16#0061#, 16#0074#, 16#006F#, 16#0072#, 16#0020#, 16#0061#, 16#0073#, 16#0073#, 16#0065#, 16#0072#, 16#0074#, 16#0020#, 16#0064#, 16#0065#, 16#0073#, 16#0069#, 16#0067#, 16#006E#, 16#0061#, 16#0074#, 16#0065#, 16#0073#, 16#0020#, 16#0074#, 16#0068#, 16#0061#, 16#0074#, 16#0020#, 16#0074#, 16#0068#, 16#0065#, 16#0020#, 16#0043#, 16#006F#, 16#006D#, 16#0062#, 16#0069#, 16#006E#, 16#0065#, 16#0064#, 16#0046#, 16#0072#, 16#0061#, 16#0067#, 16#006D#, 16#0065#, 16#006E#, 16#0074#, 16#0020#, 16#0072#, 16#0065#, 16#0070#, 16#0072#, 16#0065#, 16#0073#, 16#0065#, 16#006E#, 16#0074#, 16#0073#, 16#0020#, 16#0061#, 16#006E#, 16#0020#, 16#0061#, 16#0073#, 16#0073#, 16#0065#, 16#0072#, 16#0074#, 16#0069#, 16#006F#, 16#006E#, 16#002E#, 16#0020#, 16#0054#, 16#0068#, 16#0065#, 16#0020#, 16#0073#, 16#0065#, 16#0071#, 16#0075#, 16#0065#, 16#006E#, 16#0063#, 16#0065#, 16#0073#, 16#0020#, 16#006F#, 16#0066#, 16#0020#, 16#0074#, 16#0068#, 16#0065#, 16#0020#, 16#006F#, 16#0070#, 16#0065#, 16#0072#, 16#0061#, 16#006E#, 16#0064#, 16#0020#, 16#006F#, 16#0066#, 16#0020#, 16#0074#, 16#0068#, 16#0065#, 16#0020#, 16#0061#, 16#0073#, 16#0073#, 16#0065#, 16#0072#, 16#0074#, 16#0069#, 16#006F#, 16#006E#, 16#0020#, 16#0061#, 16#0072#, 16#0065#, 16#0020#, 16#0074#, 16#0068#, 16#0065#, 16#0020#, 16#006F#, 16#006E#, 16#006C#, 16#0079#, 16#0020#, 16#0076#, 16#0061#, 16#006C#, 16#0069#, 16#0064#, 16#0020#, 16#0063#, 16#006F#, 16#006E#, 16#0074#, 16#0069#, 16#006E#, 16#0075#, 16#0061#, 16#0074#, 16#0069#, 16#006F#, 16#006E#, 16#0073#, 16#002E#, 16#0020#, 16#0041#, 16#006C#, 16#006C#, 16#0020#, 16#006F#, 16#0074#, 16#0068#, 16#0065#, 16#0072#, 16#0020#, 16#0063#, 16#006F#, 16#006E#, 16#0074#, 16#0069#, 16#006E#, 16#0075#, 16#0061#, 16#0074#, 16#0069#, 16#006F#, 16#006E#, 16#0073#, 16#0020#, 16#0072#, 16#0065#, 16#0073#, 16#0075#, 16#006C#, 16#0074#, 16#0020#, 16#0069#, 16#006E#, 16#0020#, 16#0061#, 16#006E#, 16#0020#, 16#0069#, 16#006E#, 16#0076#, 16#0061#, 16#006C#, 16#0069#, 16#0064#, 16#0020#, 16#0074#, 16#0072#, 16#0061#, 16#0063#, 16#0065#, 16#002E#, others => 16#0000#), others => <>); -- "A region is an orthogonal part of either a composite state or a state machine. It contains states and transitions." MS_0225 : aliased Matreshka.Internals.Strings.Shared_String := (Capacity => 119, Unused => 114, Length => 114, Value => (16#0041#, 16#0020#, 16#0072#, 16#0065#, 16#0067#, 16#0069#, 16#006F#, 16#006E#, 16#0020#, 16#0069#, 16#0073#, 16#0020#, 16#0061#, 16#006E#, 16#0020#, 16#006F#, 16#0072#, 16#0074#, 16#0068#, 16#006F#, 16#0067#, 16#006F#, 16#006E#, 16#0061#, 16#006C#, 16#0020#, 16#0070#, 16#0061#, 16#0072#, 16#0074#, 16#0020#, 16#006F#, 16#0066#, 16#0020#, 16#0065#, 16#0069#, 16#0074#, 16#0068#, 16#0065#, 16#0072#, 16#0020#, 16#0061#, 16#0020#, 16#0063#, 16#006F#, 16#006D#, 16#0070#, 16#006F#, 16#0073#, 16#0069#, 16#0074#, 16#0065#, 16#0020#, 16#0073#, 16#0074#, 16#0061#, 16#0074#, 16#0065#, 16#0020#, 16#006F#, 16#0072#, 16#0020#, 16#0061#, 16#0020#, 16#0073#, 16#0074#, 16#0061#, 16#0074#, 16#0065#, 16#0020#, 16#006D#, 16#0061#, 16#0063#, 16#0068#, 16#0069#, 16#006E#, 16#0065#, 16#002E#, 16#0020#, 16#0049#, 16#0074#, 16#0020#, 16#0063#, 16#006F#, 16#006E#, 16#0074#, 16#0061#, 16#0069#, 16#006E#, 16#0073#, 16#0020#, 16#0073#, 16#0074#, 16#0061#, 16#0074#, 16#0065#, 16#0073#, 16#0020#, 16#0061#, 16#006E#, 16#0064#, 16#0020#, 16#0074#, 16#0072#, 16#0061#, 16#006E#, 16#0073#, 16#0069#, 16#0074#, 16#0069#, 16#006F#, 16#006E#, 16#0073#, 16#002E#, others => 16#0000#), others => <>); -- "A_max_interval" MS_0226 : aliased Matreshka.Internals.Strings.Shared_String := (Capacity => 15, Unused => 14, Length => 14, Value => (16#0041#, 16#005F#, 16#006D#, 16#0061#, 16#0078#, 16#005F#, 16#0069#, 16#006E#, 16#0074#, 16#0065#, 16#0072#, 16#0076#, 16#0061#, 16#006C#, others => 16#0000#), others => <>); -- "The exit Pseudostates must be Pseudostates with kind exitPoint." MS_0227 : aliased Matreshka.Internals.Strings.Shared_String := (Capacity => 71, Unused => 63, Length => 63, Value => (16#0054#, 16#0068#, 16#0065#, 16#0020#, 16#0065#, 16#0078#, 16#0069#, 16#0074#, 16#0020#, 16#0050#, 16#0073#, 16#0065#, 16#0075#, 16#0064#, 16#006F#, 16#0073#, 16#0074#, 16#0061#, 16#0074#, 16#0065#, 16#0073#, 16#0020#, 16#006D#, 16#0075#, 16#0073#, 16#0074#, 16#0020#, 16#0062#, 16#0065#, 16#0020#, 16#0050#, 16#0073#, 16#0065#, 16#0075#, 16#0064#, 16#006F#, 16#0073#, 16#0074#, 16#0061#, 16#0074#, 16#0065#, 16#0073#, 16#0020#, 16#0077#, 16#0069#, 16#0074#, 16#0068#, 16#0020#, 16#006B#, 16#0069#, 16#006E#, 16#0064#, 16#0020#, 16#0065#, 16#0078#, 16#0069#, 16#0074#, 16#0050#, 16#006F#, 16#0069#, 16#006E#, 16#0074#, 16#002E#, others => 16#0000#), others => <>); -- "The structural feature that specifies the values that may be held by the slot." MS_0228 : aliased Matreshka.Internals.Strings.Shared_String := (Capacity => 87, Unused => 78, Length => 78, Value => (16#0054#, 16#0068#, 16#0065#, 16#0020#, 16#0073#, 16#0074#, 16#0072#, 16#0075#, 16#0063#, 16#0074#, 16#0075#, 16#0072#, 16#0061#, 16#006C#, 16#0020#, 16#0066#, 16#0065#, 16#0061#, 16#0074#, 16#0075#, 16#0072#, 16#0065#, 16#0020#, 16#0074#, 16#0068#, 16#0061#, 16#0074#, 16#0020#, 16#0073#, 16#0070#, 16#0065#, 16#0063#, 16#0069#, 16#0066#, 16#0069#, 16#0065#, 16#0073#, 16#0020#, 16#0074#, 16#0068#, 16#0065#, 16#0020#, 16#0076#, 16#0061#, 16#006C#, 16#0075#, 16#0065#, 16#0073#, 16#0020#, 16#0074#, 16#0068#, 16#0061#, 16#0074#, 16#0020#, 16#006D#, 16#0061#, 16#0079#, 16#0020#, 16#0062#, 16#0065#, 16#0020#, 16#0068#, 16#0065#, 16#006C#, 16#0064#, 16#0020#, 16#0062#, 16#0079#, 16#0020#, 16#0074#, 16#0068#, 16#0065#, 16#0020#, 16#0073#, 16#006C#, 16#006F#, 16#0074#, 16#002E#, others => 16#0000#), others => <>); -- "References the Package that owns this Package." MS_0229 : aliased Matreshka.Internals.Strings.Shared_String := (Capacity => 47, Unused => 46, Length => 46, Value => (16#0052#, 16#0065#, 16#0066#, 16#0065#, 16#0072#, 16#0065#, 16#006E#, 16#0063#, 16#0065#, 16#0073#, 16#0020#, 16#0074#, 16#0068#, 16#0065#, 16#0020#, 16#0050#, 16#0061#, 16#0063#, 16#006B#, 16#0061#, 16#0067#, 16#0065#, 16#0020#, 16#0074#, 16#0068#, 16#0061#, 16#0074#, 16#0020#, 16#006F#, 16#0077#, 16#006E#, 16#0073#, 16#0020#, 16#0074#, 16#0068#, 16#0069#, 16#0073#, 16#0020#, 16#0050#, 16#0061#, 16#0063#, 16#006B#, 16#0061#, 16#0067#, 16#0065#, 16#002E#, others => 16#0000#), others => <>); -- "redefinedTransition" MS_022A : aliased Matreshka.Internals.Strings.Shared_String := (Capacity => 23, Unused => 19, Length => 19, Value => (16#0072#, 16#0065#, 16#0064#, 16#0065#, 16#0066#, 16#0069#, 16#006E#, 16#0065#, 16#0064#, 16#0054#, 16#0072#, 16#0061#, 16#006E#, 16#0073#, 16#0069#, 16#0074#, 16#0069#, 16#006F#, 16#006E#, others => 16#0000#), others => <>); -- "redefinedElement" MS_022B : aliased Matreshka.Internals.Strings.Shared_String := (Capacity => 23, Unused => 16, Length => 16, Value => (16#0072#, 16#0065#, 16#0064#, 16#0065#, 16#0066#, 16#0069#, 16#006E#, 16#0065#, 16#0064#, 16#0045#, 16#006C#, 16#0065#, 16#006D#, 16#0065#, 16#006E#, 16#0074#, others => 16#0000#), others => <>); -- "A_definingEnd_connectorEnd" MS_022C : aliased Matreshka.Internals.Strings.Shared_String := (Capacity => 31, Unused => 26, Length => 26, Value => (16#0041#, 16#005F#, 16#0064#, 16#0065#, 16#0066#, 16#0069#, 16#006E#, 16#0069#, 16#006E#, 16#0067#, 16#0045#, 16#006E#, 16#0064#, 16#005F#, 16#0063#, 16#006F#, 16#006E#, 16#006E#, 16#0065#, 16#0063#, 16#0074#, 16#006F#, 16#0072#, 16#0045#, 16#006E#, 16#0064#, others => 16#0000#), others => <>); -- "None of the new classifiers may be abstract." MS_022D : aliased Matreshka.Internals.Strings.Shared_String := (Capacity => 47, Unused => 44, Length => 44, Value => (16#004E#, 16#006F#, 16#006E#, 16#0065#, 16#0020#, 16#006F#, 16#0066#, 16#0020#, 16#0074#, 16#0068#, 16#0065#, 16#0020#, 16#006E#, 16#0065#, 16#0077#, 16#0020#, 16#0063#, 16#006C#, 16#0061#, 16#0073#, 16#0073#, 16#0069#, 16#0066#, 16#0069#, 16#0065#, 16#0072#, 16#0073#, 16#0020#, 16#006D#, 16#0061#, 16#0079#, 16#0020#, 16#0062#, 16#0065#, 16#0020#, 16#0061#, 16#0062#, 16#0073#, 16#0074#, 16#0072#, 16#0061#, 16#0063#, 16#0074#, 16#002E#, others => 16#0000#), others => <>); -- "owningState" MS_022E : aliased Matreshka.Internals.Strings.Shared_String := (Capacity => 15, Unused => 11, Length => 11, Value => (16#006F#, 16#0077#, 16#006E#, 16#0069#, 16#006E#, 16#0067#, 16#0053#, 16#0074#, 16#0061#, 16#0074#, 16#0065#, others => 16#0000#), others => <>); -- "has_qualified_name" MS_022F : aliased Matreshka.Internals.Strings.Shared_String := (Capacity => 23, Unused => 18, Length => 18, Value => (16#0068#, 16#0061#, 16#0073#, 16#005F#, 16#0071#, 16#0075#, 16#0061#, 16#006C#, 16#0069#, 16#0066#, 16#0069#, 16#0065#, 16#0064#, 16#005F#, 16#006E#, 16#0061#, 16#006D#, 16#0065#, others => 16#0000#), others => <>); -- "messageSort" MS_0230 : aliased Matreshka.Internals.Strings.Shared_String := (Capacity => 15, Unused => 11, Length => 11, Value => (16#006D#, 16#0065#, 16#0073#, 16#0073#, 16#0061#, 16#0067#, 16#0065#, 16#0053#, 16#006F#, 16#0072#, 16#0074#, others => 16#0000#), others => <>); -- "Specifies whether the return parameter is unique or not, if present." MS_0231 : aliased Matreshka.Internals.Strings.Shared_String := (Capacity => 71, Unused => 68, Length => 68, Value => (16#0053#, 16#0070#, 16#0065#, 16#0063#, 16#0069#, 16#0066#, 16#0069#, 16#0065#, 16#0073#, 16#0020#, 16#0077#, 16#0068#, 16#0065#, 16#0074#, 16#0068#, 16#0065#, 16#0072#, 16#0020#, 16#0074#, 16#0068#, 16#0065#, 16#0020#, 16#0072#, 16#0065#, 16#0074#, 16#0075#, 16#0072#, 16#006E#, 16#0020#, 16#0070#, 16#0061#, 16#0072#, 16#0061#, 16#006D#, 16#0065#, 16#0074#, 16#0065#, 16#0072#, 16#0020#, 16#0069#, 16#0073#, 16#0020#, 16#0075#, 16#006E#, 16#0069#, 16#0071#, 16#0075#, 16#0065#, 16#0020#, 16#006F#, 16#0072#, 16#0020#, 16#006E#, 16#006F#, 16#0074#, 16#002C#, 16#0020#, 16#0069#, 16#0066#, 16#0020#, 16#0070#, 16#0072#, 16#0065#, 16#0073#, 16#0065#, 16#006E#, 16#0074#, 16#002E#, others => 16#0000#), others => <>); -- "callOperationAction" MS_0232 : aliased Matreshka.Internals.Strings.Shared_String := (Capacity => 23, Unused => 19, Length => 19, Value => (16#0063#, 16#0061#, 16#006C#, 16#006C#, 16#004F#, 16#0070#, 16#0065#, 16#0072#, 16#0061#, 16#0074#, 16#0069#, 16#006F#, 16#006E#, 16#0041#, 16#0063#, 16#0074#, 16#0069#, 16#006F#, 16#006E#, others => 16#0000#), others => <>); -- "A_templateBinding_boundElement" MS_0233 : aliased Matreshka.Internals.Strings.Shared_String := (Capacity => 31, Unused => 30, Length => 30, Value => (16#0041#, 16#005F#, 16#0074#, 16#0065#, 16#006D#, 16#0070#, 16#006C#, 16#0061#, 16#0074#, 16#0065#, 16#0042#, 16#0069#, 16#006E#, 16#0064#, 16#0069#, 16#006E#, 16#0067#, 16#005F#, 16#0062#, 16#006F#, 16#0075#, 16#006E#, 16#0064#, 16#0045#, 16#006C#, 16#0065#, 16#006D#, 16#0065#, 16#006E#, 16#0074#, others => 16#0000#), others => <>); -- "References the classifiers that are used as types of the ends of the association." MS_0234 : aliased Matreshka.Internals.Strings.Shared_String := (Capacity => 87, Unused => 81, Length => 81, Value => (16#0052#, 16#0065#, 16#0066#, 16#0065#, 16#0072#, 16#0065#, 16#006E#, 16#0063#, 16#0065#, 16#0073#, 16#0020#, 16#0074#, 16#0068#, 16#0065#, 16#0020#, 16#0063#, 16#006C#, 16#0061#, 16#0073#, 16#0073#, 16#0069#, 16#0066#, 16#0069#, 16#0065#, 16#0072#, 16#0073#, 16#0020#, 16#0074#, 16#0068#, 16#0061#, 16#0074#, 16#0020#, 16#0061#, 16#0072#, 16#0065#, 16#0020#, 16#0075#, 16#0073#, 16#0065#, 16#0064#, 16#0020#, 16#0061#, 16#0073#, 16#0020#, 16#0074#, 16#0079#, 16#0070#, 16#0065#, 16#0073#, 16#0020#, 16#006F#, 16#0066#, 16#0020#, 16#0074#, 16#0068#, 16#0065#, 16#0020#, 16#0065#, 16#006E#, 16#0064#, 16#0073#, 16#0020#, 16#006F#, 16#0066#, 16#0020#, 16#0074#, 16#0068#, 16#0065#, 16#0020#, 16#0061#, 16#0073#, 16#0073#, 16#006F#, 16#0063#, 16#0069#, 16#0061#, 16#0074#, 16#0069#, 16#006F#, 16#006E#, 16#002E#, others => 16#0000#), others => <>); -- "No ExecutableNode may appear in the test or body part of more than one clause of a conditional node." MS_0235 : aliased Matreshka.Internals.Strings.Shared_String := (Capacity => 103, Unused => 100, Length => 100, Value => (16#004E#, 16#006F#, 16#0020#, 16#0045#, 16#0078#, 16#0065#, 16#0063#, 16#0075#, 16#0074#, 16#0061#, 16#0062#, 16#006C#, 16#0065#, 16#004E#, 16#006F#, 16#0064#, 16#0065#, 16#0020#, 16#006D#, 16#0061#, 16#0079#, 16#0020#, 16#0061#, 16#0070#, 16#0070#, 16#0065#, 16#0061#, 16#0072#, 16#0020#, 16#0069#, 16#006E#, 16#0020#, 16#0074#, 16#0068#, 16#0065#, 16#0020#, 16#0074#, 16#0065#, 16#0073#, 16#0074#, 16#0020#, 16#006F#, 16#0072#, 16#0020#, 16#0062#, 16#006F#, 16#0064#, 16#0079#, 16#0020#, 16#0070#, 16#0061#, 16#0072#, 16#0074#, 16#0020#, 16#006F#, 16#0066#, 16#0020#, 16#006D#, 16#006F#, 16#0072#, 16#0065#, 16#0020#, 16#0074#, 16#0068#, 16#0061#, 16#006E#, 16#0020#, 16#006F#, 16#006E#, 16#0065#, 16#0020#, 16#0063#, 16#006C#, 16#0061#, 16#0075#, 16#0073#, 16#0065#, 16#0020#, 16#006F#, 16#0066#, 16#0020#, 16#0061#, 16#0020#, 16#0063#, 16#006F#, 16#006E#, 16#0064#, 16#0069#, 16#0074#, 16#0069#, 16#006F#, 16#006E#, 16#0061#, 16#006C#, 16#0020#, 16#006E#, 16#006F#, 16#0064#, 16#0065#, 16#002E#, others => 16#0000#), others => <>); -- "The value of firstEvent[i] is related to event[i] (where i is 1 or 2). If firstEvent[i] is true, then the corresponding observation event is the first time instant the execution enters event[i]. If firstEvent[i] is false, then the corresponding observation event is the time instant the execution exits event[i]. Default value is true applied when event[i] refers an element that represents only one time instant." MS_0236 : aliased Matreshka.Internals.Strings.Shared_String := (Capacity => 431, Unused => 413, Length => 413, Value => (16#0054#, 16#0068#, 16#0065#, 16#0020#, 16#0076#, 16#0061#, 16#006C#, 16#0075#, 16#0065#, 16#0020#, 16#006F#, 16#0066#, 16#0020#, 16#0066#, 16#0069#, 16#0072#, 16#0073#, 16#0074#, 16#0045#, 16#0076#, 16#0065#, 16#006E#, 16#0074#, 16#005B#, 16#0069#, 16#005D#, 16#0020#, 16#0069#, 16#0073#, 16#0020#, 16#0072#, 16#0065#, 16#006C#, 16#0061#, 16#0074#, 16#0065#, 16#0064#, 16#0020#, 16#0074#, 16#006F#, 16#0020#, 16#0065#, 16#0076#, 16#0065#, 16#006E#, 16#0074#, 16#005B#, 16#0069#, 16#005D#, 16#0020#, 16#0028#, 16#0077#, 16#0068#, 16#0065#, 16#0072#, 16#0065#, 16#0020#, 16#0069#, 16#0020#, 16#0069#, 16#0073#, 16#0020#, 16#0031#, 16#0020#, 16#006F#, 16#0072#, 16#0020#, 16#0032#, 16#0029#, 16#002E#, 16#0020#, 16#0049#, 16#0066#, 16#0020#, 16#0066#, 16#0069#, 16#0072#, 16#0073#, 16#0074#, 16#0045#, 16#0076#, 16#0065#, 16#006E#, 16#0074#, 16#005B#, 16#0069#, 16#005D#, 16#0020#, 16#0069#, 16#0073#, 16#0020#, 16#0074#, 16#0072#, 16#0075#, 16#0065#, 16#002C#, 16#0020#, 16#0074#, 16#0068#, 16#0065#, 16#006E#, 16#0020#, 16#0074#, 16#0068#, 16#0065#, 16#0020#, 16#0063#, 16#006F#, 16#0072#, 16#0072#, 16#0065#, 16#0073#, 16#0070#, 16#006F#, 16#006E#, 16#0064#, 16#0069#, 16#006E#, 16#0067#, 16#0020#, 16#006F#, 16#0062#, 16#0073#, 16#0065#, 16#0072#, 16#0076#, 16#0061#, 16#0074#, 16#0069#, 16#006F#, 16#006E#, 16#0020#, 16#0065#, 16#0076#, 16#0065#, 16#006E#, 16#0074#, 16#0020#, 16#0069#, 16#0073#, 16#0020#, 16#0074#, 16#0068#, 16#0065#, 16#0020#, 16#0066#, 16#0069#, 16#0072#, 16#0073#, 16#0074#, 16#0020#, 16#0074#, 16#0069#, 16#006D#, 16#0065#, 16#0020#, 16#0069#, 16#006E#, 16#0073#, 16#0074#, 16#0061#, 16#006E#, 16#0074#, 16#0020#, 16#0074#, 16#0068#, 16#0065#, 16#0020#, 16#0065#, 16#0078#, 16#0065#, 16#0063#, 16#0075#, 16#0074#, 16#0069#, 16#006F#, 16#006E#, 16#0020#, 16#0065#, 16#006E#, 16#0074#, 16#0065#, 16#0072#, 16#0073#, 16#0020#, 16#0065#, 16#0076#, 16#0065#, 16#006E#, 16#0074#, 16#005B#, 16#0069#, 16#005D#, 16#002E#, 16#0020#, 16#0049#, 16#0066#, 16#0020#, 16#0066#, 16#0069#, 16#0072#, 16#0073#, 16#0074#, 16#0045#, 16#0076#, 16#0065#, 16#006E#, 16#0074#, 16#005B#, 16#0069#, 16#005D#, 16#0020#, 16#0069#, 16#0073#, 16#0020#, 16#0066#, 16#0061#, 16#006C#, 16#0073#, 16#0065#, 16#002C#, 16#0020#, 16#0074#, 16#0068#, 16#0065#, 16#006E#, 16#0020#, 16#0074#, 16#0068#, 16#0065#, 16#0020#, 16#0063#, 16#006F#, 16#0072#, 16#0072#, 16#0065#, 16#0073#, 16#0070#, 16#006F#, 16#006E#, 16#0064#, 16#0069#, 16#006E#, 16#0067#, 16#0020#, 16#006F#, 16#0062#, 16#0073#, 16#0065#, 16#0072#, 16#0076#, 16#0061#, 16#0074#, 16#0069#, 16#006F#, 16#006E#, 16#0020#, 16#0065#, 16#0076#, 16#0065#, 16#006E#, 16#0074#, 16#0020#, 16#0069#, 16#0073#, 16#0020#, 16#0074#, 16#0068#, 16#0065#, 16#0020#, 16#0074#, 16#0069#, 16#006D#, 16#0065#, 16#0020#, 16#0069#, 16#006E#, 16#0073#, 16#0074#, 16#0061#, 16#006E#, 16#0074#, 16#0020#, 16#0074#, 16#0068#, 16#0065#, 16#0020#, 16#0065#, 16#0078#, 16#0065#, 16#0063#, 16#0075#, 16#0074#, 16#0069#, 16#006F#, 16#006E#, 16#0020#, 16#0065#, 16#0078#, 16#0069#, 16#0074#, 16#0073#, 16#0020#, 16#0065#, 16#0076#, 16#0065#, 16#006E#, 16#0074#, 16#005B#, 16#0069#, 16#005D#, 16#002E#, 16#0020#, 16#0044#, 16#0065#, 16#0066#, 16#0061#, 16#0075#, 16#006C#, 16#0074#, 16#0020#, 16#0076#, 16#0061#, 16#006C#, 16#0075#, 16#0065#, 16#0020#, 16#0069#, 16#0073#, 16#0020#, 16#0074#, 16#0072#, 16#0075#, 16#0065#, 16#0020#, 16#0061#, 16#0070#, 16#0070#, 16#006C#, 16#0069#, 16#0065#, 16#0064#, 16#0020#, 16#0077#, 16#0068#, 16#0065#, 16#006E#, 16#0020#, 16#0065#, 16#0076#, 16#0065#, 16#006E#, 16#0074#, 16#005B#, 16#0069#, 16#005D#, 16#0020#, 16#0072#, 16#0065#, 16#0066#, 16#0065#, 16#0072#, 16#0073#, 16#0020#, 16#0061#, 16#006E#, 16#0020#, 16#0065#, 16#006C#, 16#0065#, 16#006D#, 16#0065#, 16#006E#, 16#0074#, 16#0020#, 16#0074#, 16#0068#, 16#0061#, 16#0074#, 16#0020#, 16#0072#, 16#0065#, 16#0070#, 16#0072#, 16#0065#, 16#0073#, 16#0065#, 16#006E#, 16#0074#, 16#0073#, 16#0020#, 16#006F#, 16#006E#, 16#006C#, 16#0079#, 16#0020#, 16#006F#, 16#006E#, 16#0065#, 16#0020#, 16#0074#, 16#0069#, 16#006D#, 16#0065#, 16#0020#, 16#0069#, 16#006E#, 16#0073#, 16#0074#, 16#0061#, 16#006E#, 16#0074#, 16#002E#, others => 16#0000#), others => <>); -- "raisedException" MS_0237 : aliased Matreshka.Internals.Strings.Shared_String := (Capacity => 23, Unused => 15, Length => 15, Value => (16#0072#, 16#0061#, 16#0069#, 16#0073#, 16#0065#, 16#0064#, 16#0045#, 16#0078#, 16#0063#, 16#0065#, 16#0070#, 16#0074#, 16#0069#, 16#006F#, 16#006E#, others => 16#0000#), others => <>); -- "LinkEndData" MS_0238 : aliased Matreshka.Internals.Strings.Shared_String := (Capacity => 15, Unused => 11, Length => 11, Value => (16#004C#, 16#0069#, 16#006E#, 16#006B#, 16#0045#, 16#006E#, 16#0064#, 16#0044#, 16#0061#, 16#0074#, 16#0061#, others => 16#0000#), others => <>); -- "The location where an Artifact is deployed onto a Node. This is typically a 'directory' or 'memory address'." MS_0239 : aliased Matreshka.Internals.Strings.Shared_String := (Capacity => 111, Unused => 108, Length => 108, Value => (16#0054#, 16#0068#, 16#0065#, 16#0020#, 16#006C#, 16#006F#, 16#0063#, 16#0061#, 16#0074#, 16#0069#, 16#006F#, 16#006E#, 16#0020#, 16#0077#, 16#0068#, 16#0065#, 16#0072#, 16#0065#, 16#0020#, 16#0061#, 16#006E#, 16#0020#, 16#0041#, 16#0072#, 16#0074#, 16#0069#, 16#0066#, 16#0061#, 16#0063#, 16#0074#, 16#0020#, 16#0069#, 16#0073#, 16#0020#, 16#0064#, 16#0065#, 16#0070#, 16#006C#, 16#006F#, 16#0079#, 16#0065#, 16#0064#, 16#0020#, 16#006F#, 16#006E#, 16#0074#, 16#006F#, 16#0020#, 16#0061#, 16#0020#, 16#004E#, 16#006F#, 16#0064#, 16#0065#, 16#002E#, 16#0020#, 16#0054#, 16#0068#, 16#0069#, 16#0073#, 16#0020#, 16#0069#, 16#0073#, 16#0020#, 16#0074#, 16#0079#, 16#0070#, 16#0069#, 16#0063#, 16#0061#, 16#006C#, 16#006C#, 16#0079#, 16#0020#, 16#0061#, 16#0020#, 16#0027#, 16#0064#, 16#0069#, 16#0072#, 16#0065#, 16#0063#, 16#0074#, 16#006F#, 16#0072#, 16#0079#, 16#0027#, 16#0020#, 16#006F#, 16#0072#, 16#0020#, 16#0027#, 16#006D#, 16#0065#, 16#006D#, 16#006F#, 16#0072#, 16#0079#, 16#0020#, 16#0061#, 16#0064#, 16#0064#, 16#0072#, 16#0065#, 16#0073#, 16#0073#, 16#0027#, 16#002E#, others => 16#0000#), others => <>); -- "Indicates that the behavior updates values." MS_023A : aliased Matreshka.Internals.Strings.Shared_String := (Capacity => 47, Unused => 43, Length => 43, Value => (16#0049#, 16#006E#, 16#0064#, 16#0069#, 16#0063#, 16#0061#, 16#0074#, 16#0065#, 16#0073#, 16#0020#, 16#0074#, 16#0068#, 16#0061#, 16#0074#, 16#0020#, 16#0074#, 16#0068#, 16#0065#, 16#0020#, 16#0062#, 16#0065#, 16#0068#, 16#0061#, 16#0076#, 16#0069#, 16#006F#, 16#0072#, 16#0020#, 16#0075#, 16#0070#, 16#0064#, 16#0061#, 16#0074#, 16#0065#, 16#0073#, 16#0020#, 16#0076#, 16#0061#, 16#006C#, 16#0075#, 16#0065#, 16#0073#, 16#002E#, others => 16#0000#), others => <>); -- "The element that is the actual parameter for this substitution." MS_023B : aliased Matreshka.Internals.Strings.Shared_String := (Capacity => 71, Unused => 63, Length => 63, Value => (16#0054#, 16#0068#, 16#0065#, 16#0020#, 16#0065#, 16#006C#, 16#0065#, 16#006D#, 16#0065#, 16#006E#, 16#0074#, 16#0020#, 16#0074#, 16#0068#, 16#0061#, 16#0074#, 16#0020#, 16#0069#, 16#0073#, 16#0020#, 16#0074#, 16#0068#, 16#0065#, 16#0020#, 16#0061#, 16#0063#, 16#0074#, 16#0075#, 16#0061#, 16#006C#, 16#0020#, 16#0070#, 16#0061#, 16#0072#, 16#0061#, 16#006D#, 16#0065#, 16#0074#, 16#0065#, 16#0072#, 16#0020#, 16#0066#, 16#006F#, 16#0072#, 16#0020#, 16#0074#, 16#0068#, 16#0069#, 16#0073#, 16#0020#, 16#0073#, 16#0075#, 16#0062#, 16#0073#, 16#0074#, 16#0069#, 16#0074#, 16#0075#, 16#0074#, 16#0069#, 16#006F#, 16#006E#, 16#002E#, others => 16#0000#), others => <>); -- "sendSignalAction" MS_023C : aliased Matreshka.Internals.Strings.Shared_String := (Capacity => 23, Unused => 16, Length => 16, Value => (16#0073#, 16#0065#, 16#006E#, 16#0064#, 16#0053#, 16#0069#, 16#0067#, 16#006E#, 16#0061#, 16#006C#, 16#0041#, 16#0063#, 16#0074#, 16#0069#, 16#006F#, 16#006E#, others => 16#0000#), others => <>); -- "Specifies the packageable elements that are owned by this Package." MS_023D : aliased Matreshka.Internals.Strings.Shared_String := (Capacity => 71, Unused => 66, Length => 66, Value => (16#0053#, 16#0070#, 16#0065#, 16#0063#, 16#0069#, 16#0066#, 16#0069#, 16#0065#, 16#0073#, 16#0020#, 16#0074#, 16#0068#, 16#0065#, 16#0020#, 16#0070#, 16#0061#, 16#0063#, 16#006B#, 16#0061#, 16#0067#, 16#0065#, 16#0061#, 16#0062#, 16#006C#, 16#0065#, 16#0020#, 16#0065#, 16#006C#, 16#0065#, 16#006D#, 16#0065#, 16#006E#, 16#0074#, 16#0073#, 16#0020#, 16#0074#, 16#0068#, 16#0061#, 16#0074#, 16#0020#, 16#0061#, 16#0072#, 16#0065#, 16#0020#, 16#006F#, 16#0077#, 16#006E#, 16#0065#, 16#0064#, 16#0020#, 16#0062#, 16#0079#, 16#0020#, 16#0074#, 16#0068#, 16#0069#, 16#0073#, 16#0020#, 16#0050#, 16#0061#, 16#0063#, 16#006B#, 16#0061#, 16#0067#, 16#0065#, 16#002E#, others => 16#0000#), others => <>); -- "InformationFlow" MS_023E : aliased Matreshka.Internals.Strings.Shared_String := (Capacity => 23, Unused => 15, Length => 15, Value => (16#0049#, 16#006E#, 16#0066#, 16#006F#, 16#0072#, 16#006D#, 16#0061#, 16#0074#, 16#0069#, 16#006F#, 16#006E#, 16#0046#, 16#006C#, 16#006F#, 16#0077#, others => 16#0000#), others => <>); -- "Specifies the operation which defines the semantics of this combination of InteractionFragments." MS_023F : aliased Matreshka.Internals.Strings.Shared_String := (Capacity => 103, Unused => 96, Length => 96, Value => (16#0053#, 16#0070#, 16#0065#, 16#0063#, 16#0069#, 16#0066#, 16#0069#, 16#0065#, 16#0073#, 16#0020#, 16#0074#, 16#0068#, 16#0065#, 16#0020#, 16#006F#, 16#0070#, 16#0065#, 16#0072#, 16#0061#, 16#0074#, 16#0069#, 16#006F#, 16#006E#, 16#0020#, 16#0077#, 16#0068#, 16#0069#, 16#0063#, 16#0068#, 16#0020#, 16#0064#, 16#0065#, 16#0066#, 16#0069#, 16#006E#, 16#0065#, 16#0073#, 16#0020#, 16#0074#, 16#0068#, 16#0065#, 16#0020#, 16#0073#, 16#0065#, 16#006D#, 16#0061#, 16#006E#, 16#0074#, 16#0069#, 16#0063#, 16#0073#, 16#0020#, 16#006F#, 16#0066#, 16#0020#, 16#0074#, 16#0068#, 16#0069#, 16#0073#, 16#0020#, 16#0063#, 16#006F#, 16#006D#, 16#0062#, 16#0069#, 16#006E#, 16#0061#, 16#0074#, 16#0069#, 16#006F#, 16#006E#, 16#0020#, 16#006F#, 16#0066#, 16#0020#, 16#0049#, 16#006E#, 16#0074#, 16#0065#, 16#0072#, 16#0061#, 16#0063#, 16#0074#, 16#0069#, 16#006F#, 16#006E#, 16#0046#, 16#0072#, 16#0061#, 16#0067#, 16#006D#, 16#0065#, 16#006E#, 16#0074#, 16#0073#, 16#002E#, others => 16#0000#), others => <>); -- "If there is no name, or one of the containing namespaces has no name, there is no qualified name." MS_0240 : aliased Matreshka.Internals.Strings.Shared_String := (Capacity => 103, Unused => 97, Length => 97, Value => (16#0049#, 16#0066#, 16#0020#, 16#0074#, 16#0068#, 16#0065#, 16#0072#, 16#0065#, 16#0020#, 16#0069#, 16#0073#, 16#0020#, 16#006E#, 16#006F#, 16#0020#, 16#006E#, 16#0061#, 16#006D#, 16#0065#, 16#002C#, 16#0020#, 16#006F#, 16#0072#, 16#0020#, 16#006F#, 16#006E#, 16#0065#, 16#0020#, 16#006F#, 16#0066#, 16#0020#, 16#0074#, 16#0068#, 16#0065#, 16#0020#, 16#0063#, 16#006F#, 16#006E#, 16#0074#, 16#0061#, 16#0069#, 16#006E#, 16#0069#, 16#006E#, 16#0067#, 16#0020#, 16#006E#, 16#0061#, 16#006D#, 16#0065#, 16#0073#, 16#0070#, 16#0061#, 16#0063#, 16#0065#, 16#0073#, 16#0020#, 16#0068#, 16#0061#, 16#0073#, 16#0020#, 16#006E#, 16#006F#, 16#0020#, 16#006E#, 16#0061#, 16#006D#, 16#0065#, 16#002C#, 16#0020#, 16#0074#, 16#0068#, 16#0065#, 16#0072#, 16#0065#, 16#0020#, 16#0069#, 16#0073#, 16#0020#, 16#006E#, 16#006F#, 16#0020#, 16#0071#, 16#0075#, 16#0061#, 16#006C#, 16#0069#, 16#0066#, 16#0069#, 16#0065#, 16#0064#, 16#0020#, 16#006E#, 16#0061#, 16#006D#, 16#0065#, 16#002E#, others => 16#0000#), others => <>); -- "same_pins" MS_0241 : aliased Matreshka.Internals.Strings.Shared_String := (Capacity => 15, Unused => 9, Length => 9, Value => (16#0073#, 16#0061#, 16#006D#, 16#0065#, 16#005F#, 16#0070#, 16#0069#, 16#006E#, 16#0073#, others => 16#0000#), others => <>); -- "ns" MS_0242 : aliased Matreshka.Internals.Strings.Shared_String := (Capacity => 7, Unused => 2, Length => 2, Value => (16#006E#, 16#0073#, others => 16#0000#), others => <>); -- "The parameters in a parameter set must all be inputs or all be outputs of the same parameterized entity, and the parameter set is owned by that entity." MS_0243 : aliased Matreshka.Internals.Strings.Shared_String := (Capacity => 159, Unused => 151, Length => 151, Value => (16#0054#, 16#0068#, 16#0065#, 16#0020#, 16#0070#, 16#0061#, 16#0072#, 16#0061#, 16#006D#, 16#0065#, 16#0074#, 16#0065#, 16#0072#, 16#0073#, 16#0020#, 16#0069#, 16#006E#, 16#0020#, 16#0061#, 16#0020#, 16#0070#, 16#0061#, 16#0072#, 16#0061#, 16#006D#, 16#0065#, 16#0074#, 16#0065#, 16#0072#, 16#0020#, 16#0073#, 16#0065#, 16#0074#, 16#0020#, 16#006D#, 16#0075#, 16#0073#, 16#0074#, 16#0020#, 16#0061#, 16#006C#, 16#006C#, 16#0020#, 16#0062#, 16#0065#, 16#0020#, 16#0069#, 16#006E#, 16#0070#, 16#0075#, 16#0074#, 16#0073#, 16#0020#, 16#006F#, 16#0072#, 16#0020#, 16#0061#, 16#006C#, 16#006C#, 16#0020#, 16#0062#, 16#0065#, 16#0020#, 16#006F#, 16#0075#, 16#0074#, 16#0070#, 16#0075#, 16#0074#, 16#0073#, 16#0020#, 16#006F#, 16#0066#, 16#0020#, 16#0074#, 16#0068#, 16#0065#, 16#0020#, 16#0073#, 16#0061#, 16#006D#, 16#0065#, 16#0020#, 16#0070#, 16#0061#, 16#0072#, 16#0061#, 16#006D#, 16#0065#, 16#0074#, 16#0065#, 16#0072#, 16#0069#, 16#007A#, 16#0065#, 16#0064#, 16#0020#, 16#0065#, 16#006E#, 16#0074#, 16#0069#, 16#0074#, 16#0079#, 16#002C#, 16#0020#, 16#0061#, 16#006E#, 16#0064#, 16#0020#, 16#0074#, 16#0068#, 16#0065#, 16#0020#, 16#0070#, 16#0061#, 16#0072#, 16#0061#, 16#006D#, 16#0065#, 16#0074#, 16#0065#, 16#0072#, 16#0020#, 16#0073#, 16#0065#, 16#0074#, 16#0020#, 16#0069#, 16#0073#, 16#0020#, 16#006F#, 16#0077#, 16#006E#, 16#0065#, 16#0064#, 16#0020#, 16#0062#, 16#0079#, 16#0020#, 16#0074#, 16#0068#, 16#0061#, 16#0074#, 16#0020#, 16#0065#, 16#006E#, 16#0074#, 16#0069#, 16#0074#, 16#0079#, 16#002E#, others => 16#0000#), others => <>); -- "Tells whether the type of the object node is to be treated as control." MS_0244 : aliased Matreshka.Internals.Strings.Shared_String := (Capacity => 79, Unused => 70, Length => 70, Value => (16#0054#, 16#0065#, 16#006C#, 16#006C#, 16#0073#, 16#0020#, 16#0077#, 16#0068#, 16#0065#, 16#0074#, 16#0068#, 16#0065#, 16#0072#, 16#0020#, 16#0074#, 16#0068#, 16#0065#, 16#0020#, 16#0074#, 16#0079#, 16#0070#, 16#0065#, 16#0020#, 16#006F#, 16#0066#, 16#0020#, 16#0074#, 16#0068#, 16#0065#, 16#0020#, 16#006F#, 16#0062#, 16#006A#, 16#0065#, 16#0063#, 16#0074#, 16#0020#, 16#006E#, 16#006F#, 16#0064#, 16#0065#, 16#0020#, 16#0069#, 16#0073#, 16#0020#, 16#0074#, 16#006F#, 16#0020#, 16#0062#, 16#0065#, 16#0020#, 16#0074#, 16#0072#, 16#0065#, 16#0061#, 16#0074#, 16#0065#, 16#0064#, 16#0020#, 16#0061#, 16#0073#, 16#0020#, 16#0063#, 16#006F#, 16#006E#, 16#0074#, 16#0072#, 16#006F#, 16#006C#, 16#002E#, others => 16#0000#), others => <>); -- "This is an enumerated type that identifies the type of message." MS_0245 : aliased Matreshka.Internals.Strings.Shared_String := (Capacity => 71, Unused => 63, Length => 63, Value => (16#0054#, 16#0068#, 16#0069#, 16#0073#, 16#0020#, 16#0069#, 16#0073#, 16#0020#, 16#0061#, 16#006E#, 16#0020#, 16#0065#, 16#006E#, 16#0075#, 16#006D#, 16#0065#, 16#0072#, 16#0061#, 16#0074#, 16#0065#, 16#0064#, 16#0020#, 16#0074#, 16#0079#, 16#0070#, 16#0065#, 16#0020#, 16#0074#, 16#0068#, 16#0061#, 16#0074#, 16#0020#, 16#0069#, 16#0064#, 16#0065#, 16#006E#, 16#0074#, 16#0069#, 16#0066#, 16#0069#, 16#0065#, 16#0073#, 16#0020#, 16#0074#, 16#0068#, 16#0065#, 16#0020#, 16#0074#, 16#0079#, 16#0070#, 16#0065#, 16#0020#, 16#006F#, 16#0066#, 16#0020#, 16#006D#, 16#0065#, 16#0073#, 16#0073#, 16#0061#, 16#0067#, 16#0065#, 16#002E#, others => 16#0000#), others => <>); -- "No node or edge in a group may be contained by its subgroups or its containing groups, transitively." MS_0246 : aliased Matreshka.Internals.Strings.Shared_String := (Capacity => 103, Unused => 100, Length => 100, Value => (16#004E#, 16#006F#, 16#0020#, 16#006E#, 16#006F#, 16#0064#, 16#0065#, 16#0020#, 16#006F#, 16#0072#, 16#0020#, 16#0065#, 16#0064#, 16#0067#, 16#0065#, 16#0020#, 16#0069#, 16#006E#, 16#0020#, 16#0061#, 16#0020#, 16#0067#, 16#0072#, 16#006F#, 16#0075#, 16#0070#, 16#0020#, 16#006D#, 16#0061#, 16#0079#, 16#0020#, 16#0062#, 16#0065#, 16#0020#, 16#0063#, 16#006F#, 16#006E#, 16#0074#, 16#0061#, 16#0069#, 16#006E#, 16#0065#, 16#0064#, 16#0020#, 16#0062#, 16#0079#, 16#0020#, 16#0069#, 16#0074#, 16#0073#, 16#0020#, 16#0073#, 16#0075#, 16#0062#, 16#0067#, 16#0072#, 16#006F#, 16#0075#, 16#0070#, 16#0073#, 16#0020#, 16#006F#, 16#0072#, 16#0020#, 16#0069#, 16#0074#, 16#0073#, 16#0020#, 16#0063#, 16#006F#, 16#006E#, 16#0074#, 16#0061#, 16#0069#, 16#006E#, 16#0069#, 16#006E#, 16#0067#, 16#0020#, 16#0067#, 16#0072#, 16#006F#, 16#0075#, 16#0070#, 16#0073#, 16#002C#, 16#0020#, 16#0074#, 16#0072#, 16#0061#, 16#006E#, 16#0073#, 16#0069#, 16#0074#, 16#0069#, 16#0076#, 16#0065#, 16#006C#, 16#0079#, 16#002E#, others => 16#0000#), others => <>); -- "selection_behavior" MS_0247 : aliased Matreshka.Internals.Strings.Shared_String := (Capacity => 23, Unused => 18, Length => 18, Value => (16#0073#, 16#0065#, 16#006C#, 16#0065#, 16#0063#, 16#0074#, 16#0069#, 16#006F#, 16#006E#, 16#005F#, 16#0062#, 16#0065#, 16#0068#, 16#0061#, 16#0076#, 16#0069#, 16#006F#, 16#0072#, others => 16#0000#), others => <>); -- "A delegation connector is a connector that links the external contract of a component (as specified by its ports) to the realization of that behavior. It represents the forwarding of events (operation requests and events): a signal that arrives at a port that has a delegation connector to one or more parts or ports on parts will be passed on to those targets for handling. An assembly connector is a connector between two or more parts or ports on parts that defines that one or more parts provide the services that other parts use." MS_0248 : aliased Matreshka.Internals.Strings.Shared_String := (Capacity => 551, Unused => 534, Length => 534, Value => (16#0041#, 16#0020#, 16#0064#, 16#0065#, 16#006C#, 16#0065#, 16#0067#, 16#0061#, 16#0074#, 16#0069#, 16#006F#, 16#006E#, 16#0020#, 16#0063#, 16#006F#, 16#006E#, 16#006E#, 16#0065#, 16#0063#, 16#0074#, 16#006F#, 16#0072#, 16#0020#, 16#0069#, 16#0073#, 16#0020#, 16#0061#, 16#0020#, 16#0063#, 16#006F#, 16#006E#, 16#006E#, 16#0065#, 16#0063#, 16#0074#, 16#006F#, 16#0072#, 16#0020#, 16#0074#, 16#0068#, 16#0061#, 16#0074#, 16#0020#, 16#006C#, 16#0069#, 16#006E#, 16#006B#, 16#0073#, 16#0020#, 16#0074#, 16#0068#, 16#0065#, 16#0020#, 16#0065#, 16#0078#, 16#0074#, 16#0065#, 16#0072#, 16#006E#, 16#0061#, 16#006C#, 16#0020#, 16#0063#, 16#006F#, 16#006E#, 16#0074#, 16#0072#, 16#0061#, 16#0063#, 16#0074#, 16#0020#, 16#006F#, 16#0066#, 16#0020#, 16#0061#, 16#0020#, 16#0063#, 16#006F#, 16#006D#, 16#0070#, 16#006F#, 16#006E#, 16#0065#, 16#006E#, 16#0074#, 16#0020#, 16#0028#, 16#0061#, 16#0073#, 16#0020#, 16#0073#, 16#0070#, 16#0065#, 16#0063#, 16#0069#, 16#0066#, 16#0069#, 16#0065#, 16#0064#, 16#0020#, 16#0062#, 16#0079#, 16#0020#, 16#0069#, 16#0074#, 16#0073#, 16#0020#, 16#0070#, 16#006F#, 16#0072#, 16#0074#, 16#0073#, 16#0029#, 16#0020#, 16#0074#, 16#006F#, 16#0020#, 16#0074#, 16#0068#, 16#0065#, 16#0020#, 16#0072#, 16#0065#, 16#0061#, 16#006C#, 16#0069#, 16#007A#, 16#0061#, 16#0074#, 16#0069#, 16#006F#, 16#006E#, 16#0020#, 16#006F#, 16#0066#, 16#0020#, 16#0074#, 16#0068#, 16#0061#, 16#0074#, 16#0020#, 16#0062#, 16#0065#, 16#0068#, 16#0061#, 16#0076#, 16#0069#, 16#006F#, 16#0072#, 16#002E#, 16#0020#, 16#0049#, 16#0074#, 16#0020#, 16#0072#, 16#0065#, 16#0070#, 16#0072#, 16#0065#, 16#0073#, 16#0065#, 16#006E#, 16#0074#, 16#0073#, 16#0020#, 16#0074#, 16#0068#, 16#0065#, 16#0020#, 16#0066#, 16#006F#, 16#0072#, 16#0077#, 16#0061#, 16#0072#, 16#0064#, 16#0069#, 16#006E#, 16#0067#, 16#0020#, 16#006F#, 16#0066#, 16#0020#, 16#0065#, 16#0076#, 16#0065#, 16#006E#, 16#0074#, 16#0073#, 16#0020#, 16#0028#, 16#006F#, 16#0070#, 16#0065#, 16#0072#, 16#0061#, 16#0074#, 16#0069#, 16#006F#, 16#006E#, 16#0020#, 16#0072#, 16#0065#, 16#0071#, 16#0075#, 16#0065#, 16#0073#, 16#0074#, 16#0073#, 16#0020#, 16#0061#, 16#006E#, 16#0064#, 16#0020#, 16#0065#, 16#0076#, 16#0065#, 16#006E#, 16#0074#, 16#0073#, 16#0029#, 16#003A#, 16#0020#, 16#0061#, 16#0020#, 16#0073#, 16#0069#, 16#0067#, 16#006E#, 16#0061#, 16#006C#, 16#0020#, 16#0074#, 16#0068#, 16#0061#, 16#0074#, 16#0020#, 16#0061#, 16#0072#, 16#0072#, 16#0069#, 16#0076#, 16#0065#, 16#0073#, 16#0020#, 16#0061#, 16#0074#, 16#0020#, 16#0061#, 16#0020#, 16#0070#, 16#006F#, 16#0072#, 16#0074#, 16#0020#, 16#0074#, 16#0068#, 16#0061#, 16#0074#, 16#0020#, 16#0068#, 16#0061#, 16#0073#, 16#0020#, 16#0061#, 16#0020#, 16#0064#, 16#0065#, 16#006C#, 16#0065#, 16#0067#, 16#0061#, 16#0074#, 16#0069#, 16#006F#, 16#006E#, 16#0020#, 16#0063#, 16#006F#, 16#006E#, 16#006E#, 16#0065#, 16#0063#, 16#0074#, 16#006F#, 16#0072#, 16#0020#, 16#0074#, 16#006F#, 16#0020#, 16#006F#, 16#006E#, 16#0065#, 16#0020#, 16#006F#, 16#0072#, 16#0020#, 16#006D#, 16#006F#, 16#0072#, 16#0065#, 16#0020#, 16#0070#, 16#0061#, 16#0072#, 16#0074#, 16#0073#, 16#0020#, 16#006F#, 16#0072#, 16#0020#, 16#0070#, 16#006F#, 16#0072#, 16#0074#, 16#0073#, 16#0020#, 16#006F#, 16#006E#, 16#0020#, 16#0070#, 16#0061#, 16#0072#, 16#0074#, 16#0073#, 16#0020#, 16#0077#, 16#0069#, 16#006C#, 16#006C#, 16#0020#, 16#0062#, 16#0065#, 16#0020#, 16#0070#, 16#0061#, 16#0073#, 16#0073#, 16#0065#, 16#0064#, 16#0020#, 16#006F#, 16#006E#, 16#0020#, 16#0074#, 16#006F#, 16#0020#, 16#0074#, 16#0068#, 16#006F#, 16#0073#, 16#0065#, 16#0020#, 16#0074#, 16#0061#, 16#0072#, 16#0067#, 16#0065#, 16#0074#, 16#0073#, 16#0020#, 16#0066#, 16#006F#, 16#0072#, 16#0020#, 16#0068#, 16#0061#, 16#006E#, 16#0064#, 16#006C#, 16#0069#, 16#006E#, 16#0067#, 16#002E#, 16#0020#, 16#0041#, 16#006E#, 16#0020#, 16#0061#, 16#0073#, 16#0073#, 16#0065#, 16#006D#, 16#0062#, 16#006C#, 16#0079#, 16#0020#, 16#0063#, 16#006F#, 16#006E#, 16#006E#, 16#0065#, 16#0063#, 16#0074#, 16#006F#, 16#0072#, 16#0020#, 16#0069#, 16#0073#, 16#0020#, 16#0061#, 16#0020#, 16#0063#, 16#006F#, 16#006E#, 16#006E#, 16#0065#, 16#0063#, 16#0074#, 16#006F#, 16#0072#, 16#0020#, 16#0062#, 16#0065#, 16#0074#, 16#0077#, 16#0065#, 16#0065#, 16#006E#, 16#0020#, 16#0074#, 16#0077#, 16#006F#, 16#0020#, 16#006F#, 16#0072#, 16#0020#, 16#006D#, 16#006F#, 16#0072#, 16#0065#, 16#0020#, 16#0070#, 16#0061#, 16#0072#, 16#0074#, 16#0073#, 16#0020#, 16#006F#, 16#0072#, 16#0020#, 16#0070#, 16#006F#, 16#0072#, 16#0074#, 16#0073#, 16#0020#, 16#006F#, 16#006E#, 16#0020#, 16#0070#, 16#0061#, 16#0072#, 16#0074#, 16#0073#, 16#0020#, 16#0074#, 16#0068#, 16#0061#, 16#0074#, 16#0020#, 16#0064#, 16#0065#, 16#0066#, 16#0069#, 16#006E#, 16#0065#, 16#0073#, 16#0020#, 16#0074#, 16#0068#, 16#0061#, 16#0074#, 16#0020#, 16#006F#, 16#006E#, 16#0065#, 16#0020#, 16#006F#, 16#0072#, 16#0020#, 16#006D#, 16#006F#, 16#0072#, 16#0065#, 16#0020#, 16#0070#, 16#0061#, 16#0072#, 16#0074#, 16#0073#, 16#0020#, 16#0070#, 16#0072#, 16#006F#, 16#0076#, 16#0069#, 16#0064#, 16#0065#, 16#0020#, 16#0074#, 16#0068#, 16#0065#, 16#0020#, 16#0073#, 16#0065#, 16#0072#, 16#0076#, 16#0069#, 16#0063#, 16#0065#, 16#0073#, 16#0020#, 16#0074#, 16#0068#, 16#0061#, 16#0074#, 16#0020#, 16#006F#, 16#0074#, 16#0068#, 16#0065#, 16#0072#, 16#0020#, 16#0070#, 16#0061#, 16#0072#, 16#0074#, 16#0073#, 16#0020#, 16#0075#, 16#0073#, 16#0065#, 16#002E#, others => 16#0000#), others => <>); -- "This is an enumerated type that identifies the type of communication action that was used to generate the message." MS_0249 : aliased Matreshka.Internals.Strings.Shared_String := (Capacity => 119, Unused => 114, Length => 114, Value => (16#0054#, 16#0068#, 16#0069#, 16#0073#, 16#0020#, 16#0069#, 16#0073#, 16#0020#, 16#0061#, 16#006E#, 16#0020#, 16#0065#, 16#006E#, 16#0075#, 16#006D#, 16#0065#, 16#0072#, 16#0061#, 16#0074#, 16#0065#, 16#0064#, 16#0020#, 16#0074#, 16#0079#, 16#0070#, 16#0065#, 16#0020#, 16#0074#, 16#0068#, 16#0061#, 16#0074#, 16#0020#, 16#0069#, 16#0064#, 16#0065#, 16#006E#, 16#0074#, 16#0069#, 16#0066#, 16#0069#, 16#0065#, 16#0073#, 16#0020#, 16#0074#, 16#0068#, 16#0065#, 16#0020#, 16#0074#, 16#0079#, 16#0070#, 16#0065#, 16#0020#, 16#006F#, 16#0066#, 16#0020#, 16#0063#, 16#006F#, 16#006D#, 16#006D#, 16#0075#, 16#006E#, 16#0069#, 16#0063#, 16#0061#, 16#0074#, 16#0069#, 16#006F#, 16#006E#, 16#0020#, 16#0061#, 16#0063#, 16#0074#, 16#0069#, 16#006F#, 16#006E#, 16#0020#, 16#0074#, 16#0068#, 16#0061#, 16#0074#, 16#0020#, 16#0077#, 16#0061#, 16#0073#, 16#0020#, 16#0075#, 16#0073#, 16#0065#, 16#0064#, 16#0020#, 16#0074#, 16#006F#, 16#0020#, 16#0067#, 16#0065#, 16#006E#, 16#0065#, 16#0072#, 16#0061#, 16#0074#, 16#0065#, 16#0020#, 16#0074#, 16#0068#, 16#0065#, 16#0020#, 16#006D#, 16#0065#, 16#0073#, 16#0073#, 16#0061#, 16#0067#, 16#0065#, 16#002E#, others => 16#0000#), others => <>); -- "The action must be contained in an behavior that has a host classifier." MS_024A : aliased Matreshka.Internals.Strings.Shared_String := (Capacity => 79, Unused => 71, Length => 71, Value => (16#0054#, 16#0068#, 16#0065#, 16#0020#, 16#0061#, 16#0063#, 16#0074#, 16#0069#, 16#006F#, 16#006E#, 16#0020#, 16#006D#, 16#0075#, 16#0073#, 16#0074#, 16#0020#, 16#0062#, 16#0065#, 16#0020#, 16#0063#, 16#006F#, 16#006E#, 16#0074#, 16#0061#, 16#0069#, 16#006E#, 16#0065#, 16#0064#, 16#0020#, 16#0069#, 16#006E#, 16#0020#, 16#0061#, 16#006E#, 16#0020#, 16#0062#, 16#0065#, 16#0068#, 16#0061#, 16#0076#, 16#0069#, 16#006F#, 16#0072#, 16#0020#, 16#0074#, 16#0068#, 16#0061#, 16#0074#, 16#0020#, 16#0068#, 16#0061#, 16#0073#, 16#0020#, 16#0061#, 16#0020#, 16#0068#, 16#006F#, 16#0073#, 16#0074#, 16#0020#, 16#0063#, 16#006C#, 16#0061#, 16#0073#, 16#0073#, 16#0069#, 16#0066#, 16#0069#, 16#0065#, 16#0072#, 16#002E#, others => 16#0000#), others => <>); -- "Specifies a string that is the comment." MS_024B : aliased Matreshka.Internals.Strings.Shared_String := (Capacity => 47, Unused => 39, Length => 39, Value => (16#0053#, 16#0070#, 16#0065#, 16#0063#, 16#0069#, 16#0066#, 16#0069#, 16#0065#, 16#0073#, 16#0020#, 16#0061#, 16#0020#, 16#0073#, 16#0074#, 16#0072#, 16#0069#, 16#006E#, 16#0067#, 16#0020#, 16#0074#, 16#0068#, 16#0061#, 16#0074#, 16#0020#, 16#0069#, 16#0073#, 16#0020#, 16#0074#, 16#0068#, 16#0065#, 16#0020#, 16#0063#, 16#006F#, 16#006D#, 16#006D#, 16#0065#, 16#006E#, 16#0074#, 16#002E#, others => 16#0000#), others => <>); -- "A_result_loopNode" MS_024C : aliased Matreshka.Internals.Strings.Shared_String := (Capacity => 23, Unused => 17, Length => 17, Value => (16#0041#, 16#005F#, 16#0072#, 16#0065#, 16#0073#, 16#0075#, 16#006C#, 16#0074#, 16#005F#, 16#006C#, 16#006F#, 16#006F#, 16#0070#, 16#004E#, 16#006F#, 16#0064#, 16#0065#, others => 16#0000#), others => <>); -- "A_packageMerge_receivingPackage" MS_024D : aliased Matreshka.Internals.Strings.Shared_String := (Capacity => 39, Unused => 31, Length => 31, Value => (16#0041#, 16#005F#, 16#0070#, 16#0061#, 16#0063#, 16#006B#, 16#0061#, 16#0067#, 16#0065#, 16#004D#, 16#0065#, 16#0072#, 16#0067#, 16#0065#, 16#005F#, 16#0072#, 16#0065#, 16#0063#, 16#0065#, 16#0069#, 16#0076#, 16#0069#, 16#006E#, 16#0067#, 16#0050#, 16#0061#, 16#0063#, 16#006B#, 16#0061#, 16#0067#, 16#0065#, others => 16#0000#), others => <>); -- "A merge node is a control node that brings together multiple alternate flows. It is not used to synchronize concurrent flows but to accept one among several alternate flows." MS_024E : aliased Matreshka.Internals.Strings.Shared_String := (Capacity => 183, Unused => 173, Length => 173, Value => (16#0041#, 16#0020#, 16#006D#, 16#0065#, 16#0072#, 16#0067#, 16#0065#, 16#0020#, 16#006E#, 16#006F#, 16#0064#, 16#0065#, 16#0020#, 16#0069#, 16#0073#, 16#0020#, 16#0061#, 16#0020#, 16#0063#, 16#006F#, 16#006E#, 16#0074#, 16#0072#, 16#006F#, 16#006C#, 16#0020#, 16#006E#, 16#006F#, 16#0064#, 16#0065#, 16#0020#, 16#0074#, 16#0068#, 16#0061#, 16#0074#, 16#0020#, 16#0062#, 16#0072#, 16#0069#, 16#006E#, 16#0067#, 16#0073#, 16#0020#, 16#0074#, 16#006F#, 16#0067#, 16#0065#, 16#0074#, 16#0068#, 16#0065#, 16#0072#, 16#0020#, 16#006D#, 16#0075#, 16#006C#, 16#0074#, 16#0069#, 16#0070#, 16#006C#, 16#0065#, 16#0020#, 16#0061#, 16#006C#, 16#0074#, 16#0065#, 16#0072#, 16#006E#, 16#0061#, 16#0074#, 16#0065#, 16#0020#, 16#0066#, 16#006C#, 16#006F#, 16#0077#, 16#0073#, 16#002E#, 16#0020#, 16#0049#, 16#0074#, 16#0020#, 16#0069#, 16#0073#, 16#0020#, 16#006E#, 16#006F#, 16#0074#, 16#0020#, 16#0075#, 16#0073#, 16#0065#, 16#0064#, 16#0020#, 16#0074#, 16#006F#, 16#0020#, 16#0073#, 16#0079#, 16#006E#, 16#0063#, 16#0068#, 16#0072#, 16#006F#, 16#006E#, 16#0069#, 16#007A#, 16#0065#, 16#0020#, 16#0063#, 16#006F#, 16#006E#, 16#0063#, 16#0075#, 16#0072#, 16#0072#, 16#0065#, 16#006E#, 16#0074#, 16#0020#, 16#0066#, 16#006C#, 16#006F#, 16#0077#, 16#0073#, 16#0020#, 16#0062#, 16#0075#, 16#0074#, 16#0020#, 16#0074#, 16#006F#, 16#0020#, 16#0061#, 16#0063#, 16#0063#, 16#0065#, 16#0070#, 16#0074#, 16#0020#, 16#006F#, 16#006E#, 16#0065#, 16#0020#, 16#0061#, 16#006D#, 16#006F#, 16#006E#, 16#0067#, 16#0020#, 16#0073#, 16#0065#, 16#0076#, 16#0065#, 16#0072#, 16#0061#, 16#006C#, 16#0020#, 16#0061#, 16#006C#, 16#0074#, 16#0065#, 16#0072#, 16#006E#, 16#0061#, 16#0074#, 16#0065#, 16#0020#, 16#0066#, 16#006C#, 16#006F#, 16#0077#, 16#0073#, 16#002E#, others => 16#0000#), others => <>); -- "belongsToPSM" MS_024F : aliased Matreshka.Internals.Strings.Shared_String := (Capacity => 15, Unused => 12, Length => 12, Value => (16#0062#, 16#0065#, 16#006C#, 16#006F#, 16#006E#, 16#0067#, 16#0073#, 16#0054#, 16#006F#, 16#0050#, 16#0053#, 16#004D#, others => 16#0000#), others => <>); -- "The Messages contained in this Interaction." MS_0250 : aliased Matreshka.Internals.Strings.Shared_String := (Capacity => 47, Unused => 43, Length => 43, Value => (16#0054#, 16#0068#, 16#0065#, 16#0020#, 16#004D#, 16#0065#, 16#0073#, 16#0073#, 16#0061#, 16#0067#, 16#0065#, 16#0073#, 16#0020#, 16#0063#, 16#006F#, 16#006E#, 16#0074#, 16#0061#, 16#0069#, 16#006E#, 16#0065#, 16#0064#, 16#0020#, 16#0069#, 16#006E#, 16#0020#, 16#0074#, 16#0068#, 16#0069#, 16#0073#, 16#0020#, 16#0049#, 16#006E#, 16#0074#, 16#0065#, 16#0072#, 16#0061#, 16#0063#, 16#0074#, 16#0069#, 16#006F#, 16#006E#, 16#002E#, others => 16#0000#), others => <>); -- "A template signature bundles the set of formal template parameters for a templated element." MS_0251 : aliased Matreshka.Internals.Strings.Shared_String := (Capacity => 95, Unused => 91, Length => 91, Value => (16#0041#, 16#0020#, 16#0074#, 16#0065#, 16#006D#, 16#0070#, 16#006C#, 16#0061#, 16#0074#, 16#0065#, 16#0020#, 16#0073#, 16#0069#, 16#0067#, 16#006E#, 16#0061#, 16#0074#, 16#0075#, 16#0072#, 16#0065#, 16#0020#, 16#0062#, 16#0075#, 16#006E#, 16#0064#, 16#006C#, 16#0065#, 16#0073#, 16#0020#, 16#0074#, 16#0068#, 16#0065#, 16#0020#, 16#0073#, 16#0065#, 16#0074#, 16#0020#, 16#006F#, 16#0066#, 16#0020#, 16#0066#, 16#006F#, 16#0072#, 16#006D#, 16#0061#, 16#006C#, 16#0020#, 16#0074#, 16#0065#, 16#006D#, 16#0070#, 16#006C#, 16#0061#, 16#0074#, 16#0065#, 16#0020#, 16#0070#, 16#0061#, 16#0072#, 16#0061#, 16#006D#, 16#0065#, 16#0074#, 16#0065#, 16#0072#, 16#0073#, 16#0020#, 16#0066#, 16#006F#, 16#0072#, 16#0020#, 16#0061#, 16#0020#, 16#0074#, 16#0065#, 16#006D#, 16#0070#, 16#006C#, 16#0061#, 16#0074#, 16#0065#, 16#0064#, 16#0020#, 16#0065#, 16#006C#, 16#0065#, 16#006D#, 16#0065#, 16#006E#, 16#0074#, 16#002E#, others => 16#0000#), others => <>); -- "The extension points referenced by the extend relationship must belong to the use case that is being extended." MS_0252 : aliased Matreshka.Internals.Strings.Shared_String := (Capacity => 119, Unused => 110, Length => 110, Value => (16#0054#, 16#0068#, 16#0065#, 16#0020#, 16#0065#, 16#0078#, 16#0074#, 16#0065#, 16#006E#, 16#0073#, 16#0069#, 16#006F#, 16#006E#, 16#0020#, 16#0070#, 16#006F#, 16#0069#, 16#006E#, 16#0074#, 16#0073#, 16#0020#, 16#0072#, 16#0065#, 16#0066#, 16#0065#, 16#0072#, 16#0065#, 16#006E#, 16#0063#, 16#0065#, 16#0064#, 16#0020#, 16#0062#, 16#0079#, 16#0020#, 16#0074#, 16#0068#, 16#0065#, 16#0020#, 16#0065#, 16#0078#, 16#0074#, 16#0065#, 16#006E#, 16#0064#, 16#0020#, 16#0072#, 16#0065#, 16#006C#, 16#0061#, 16#0074#, 16#0069#, 16#006F#, 16#006E#, 16#0073#, 16#0068#, 16#0069#, 16#0070#, 16#0020#, 16#006D#, 16#0075#, 16#0073#, 16#0074#, 16#0020#, 16#0062#, 16#0065#, 16#006C#, 16#006F#, 16#006E#, 16#0067#, 16#0020#, 16#0074#, 16#006F#, 16#0020#, 16#0074#, 16#0068#, 16#0065#, 16#0020#, 16#0075#, 16#0073#, 16#0065#, 16#0020#, 16#0063#, 16#0061#, 16#0073#, 16#0065#, 16#0020#, 16#0074#, 16#0068#, 16#0061#, 16#0074#, 16#0020#, 16#0069#, 16#0073#, 16#0020#, 16#0062#, 16#0065#, 16#0069#, 16#006E#, 16#0067#, 16#0020#, 16#0065#, 16#0078#, 16#0074#, 16#0065#, 16#006E#, 16#0064#, 16#0065#, 16#0064#, 16#002E#, others => 16#0000#), others => <>); -- "Provides input to the action." MS_0253 : aliased Matreshka.Internals.Strings.Shared_String := (Capacity => 31, Unused => 29, Length => 29, Value => (16#0050#, 16#0072#, 16#006F#, 16#0076#, 16#0069#, 16#0064#, 16#0065#, 16#0073#, 16#0020#, 16#0069#, 16#006E#, 16#0070#, 16#0075#, 16#0074#, 16#0020#, 16#0074#, 16#006F#, 16#0020#, 16#0074#, 16#0068#, 16#0065#, 16#0020#, 16#0061#, 16#0063#, 16#0074#, 16#0069#, 16#006F#, 16#006E#, 16#002E#, others => 16#0000#), others => <>); -- "References the classifier in which context this element may be redefined." MS_0254 : aliased Matreshka.Internals.Strings.Shared_String := (Capacity => 79, Unused => 73, Length => 73, Value => (16#0052#, 16#0065#, 16#0066#, 16#0065#, 16#0072#, 16#0065#, 16#006E#, 16#0063#, 16#0065#, 16#0073#, 16#0020#, 16#0074#, 16#0068#, 16#0065#, 16#0020#, 16#0063#, 16#006C#, 16#0061#, 16#0073#, 16#0073#, 16#0069#, 16#0066#, 16#0069#, 16#0065#, 16#0072#, 16#0020#, 16#0069#, 16#006E#, 16#0020#, 16#0077#, 16#0068#, 16#0069#, 16#0063#, 16#0068#, 16#0020#, 16#0063#, 16#006F#, 16#006E#, 16#0074#, 16#0065#, 16#0078#, 16#0074#, 16#0020#, 16#0074#, 16#0068#, 16#0069#, 16#0073#, 16#0020#, 16#0065#, 16#006C#, 16#0065#, 16#006D#, 16#0065#, 16#006E#, 16#0074#, 16#0020#, 16#006D#, 16#0061#, 16#0079#, 16#0020#, 16#0062#, 16#0065#, 16#0020#, 16#0072#, 16#0065#, 16#0064#, 16#0065#, 16#0066#, 16#0069#, 16#006E#, 16#0065#, 16#0064#, 16#002E#, others => 16#0000#), others => <>); -- "unmarshall_signal_events" MS_0255 : aliased Matreshka.Internals.Strings.Shared_String := (Capacity => 31, Unused => 24, Length => 24, Value => (16#0075#, 16#006E#, 16#006D#, 16#0061#, 16#0072#, 16#0073#, 16#0068#, 16#0061#, 16#006C#, 16#006C#, 16#005F#, 16#0073#, 16#0069#, 16#0067#, 16#006E#, 16#0061#, 16#006C#, 16#005F#, 16#0065#, 16#0076#, 16#0065#, 16#006E#, 16#0074#, 16#0073#, others => 16#0000#), others => <>); -- "A_inheritedMember_classifier" MS_0256 : aliased Matreshka.Internals.Strings.Shared_String := (Capacity => 31, Unused => 28, Length => 28, Value => (16#0041#, 16#005F#, 16#0069#, 16#006E#, 16#0068#, 16#0065#, 16#0072#, 16#0069#, 16#0074#, 16#0065#, 16#0064#, 16#004D#, 16#0065#, 16#006D#, 16#0062#, 16#0065#, 16#0072#, 16#005F#, 16#0063#, 16#006C#, 16#0061#, 16#0073#, 16#0073#, 16#0069#, 16#0066#, 16#0069#, 16#0065#, 16#0072#, others => 16#0000#), others => <>); -- "A list of output pins that constitute the data flow output of the entire loop." MS_0257 : aliased Matreshka.Internals.Strings.Shared_String := (Capacity => 87, Unused => 78, Length => 78, Value => (16#0041#, 16#0020#, 16#006C#, 16#0069#, 16#0073#, 16#0074#, 16#0020#, 16#006F#, 16#0066#, 16#0020#, 16#006F#, 16#0075#, 16#0074#, 16#0070#, 16#0075#, 16#0074#, 16#0020#, 16#0070#, 16#0069#, 16#006E#, 16#0073#, 16#0020#, 16#0074#, 16#0068#, 16#0061#, 16#0074#, 16#0020#, 16#0063#, 16#006F#, 16#006E#, 16#0073#, 16#0074#, 16#0069#, 16#0074#, 16#0075#, 16#0074#, 16#0065#, 16#0020#, 16#0074#, 16#0068#, 16#0065#, 16#0020#, 16#0064#, 16#0061#, 16#0074#, 16#0061#, 16#0020#, 16#0066#, 16#006C#, 16#006F#, 16#0077#, 16#0020#, 16#006F#, 16#0075#, 16#0074#, 16#0070#, 16#0075#, 16#0074#, 16#0020#, 16#006F#, 16#0066#, 16#0020#, 16#0074#, 16#0068#, 16#0065#, 16#0020#, 16#0065#, 16#006E#, 16#0074#, 16#0069#, 16#0072#, 16#0065#, 16#0020#, 16#006C#, 16#006F#, 16#006F#, 16#0070#, 16#002E#, others => 16#0000#), others => <>); -- "Element" MS_0258 : aliased Matreshka.Internals.Strings.Shared_String := (Capacity => 15, Unused => 7, Length => 7, Value => (16#0045#, 16#006C#, 16#0065#, 16#006D#, 16#0065#, 16#006E#, 16#0074#, others => 16#0000#), others => <>); -- "A_defaultValue_owningProperty" MS_0259 : aliased Matreshka.Internals.Strings.Shared_String := (Capacity => 31, Unused => 29, Length => 29, Value => (16#0041#, 16#005F#, 16#0064#, 16#0065#, 16#0066#, 16#0061#, 16#0075#, 16#006C#, 16#0074#, 16#0056#, 16#0061#, 16#006C#, 16#0075#, 16#0065#, 16#005F#, 16#006F#, 16#0077#, 16#006E#, 16#0069#, 16#006E#, 16#0067#, 16#0050#, 16#0072#, 16#006F#, 16#0070#, 16#0065#, 16#0072#, 16#0074#, 16#0079#, others => 16#0000#), others => <>); -- "A call behavior action is a call action that invokes a behavior directly rather than invoking a behavioral feature that, in turn, results in the invocation of that behavior. The argument values of the action are available to the execution of the invoked behavior. For synchronous calls the execution of the call behavior action waits until the execution of the invoked behavior completes and a result is returned on its output pin. The action completes immediately without a result, if the call is asynchronous. In particular, the invoked behavior may be an activity." MS_025A : aliased Matreshka.Internals.Strings.Shared_String := (Capacity => 591, Unused => 567, Length => 567, Value => (16#0041#, 16#0020#, 16#0063#, 16#0061#, 16#006C#, 16#006C#, 16#0020#, 16#0062#, 16#0065#, 16#0068#, 16#0061#, 16#0076#, 16#0069#, 16#006F#, 16#0072#, 16#0020#, 16#0061#, 16#0063#, 16#0074#, 16#0069#, 16#006F#, 16#006E#, 16#0020#, 16#0069#, 16#0073#, 16#0020#, 16#0061#, 16#0020#, 16#0063#, 16#0061#, 16#006C#, 16#006C#, 16#0020#, 16#0061#, 16#0063#, 16#0074#, 16#0069#, 16#006F#, 16#006E#, 16#0020#, 16#0074#, 16#0068#, 16#0061#, 16#0074#, 16#0020#, 16#0069#, 16#006E#, 16#0076#, 16#006F#, 16#006B#, 16#0065#, 16#0073#, 16#0020#, 16#0061#, 16#0020#, 16#0062#, 16#0065#, 16#0068#, 16#0061#, 16#0076#, 16#0069#, 16#006F#, 16#0072#, 16#0020#, 16#0064#, 16#0069#, 16#0072#, 16#0065#, 16#0063#, 16#0074#, 16#006C#, 16#0079#, 16#0020#, 16#0072#, 16#0061#, 16#0074#, 16#0068#, 16#0065#, 16#0072#, 16#0020#, 16#0074#, 16#0068#, 16#0061#, 16#006E#, 16#0020#, 16#0069#, 16#006E#, 16#0076#, 16#006F#, 16#006B#, 16#0069#, 16#006E#, 16#0067#, 16#0020#, 16#0061#, 16#0020#, 16#0062#, 16#0065#, 16#0068#, 16#0061#, 16#0076#, 16#0069#, 16#006F#, 16#0072#, 16#0061#, 16#006C#, 16#0020#, 16#0066#, 16#0065#, 16#0061#, 16#0074#, 16#0075#, 16#0072#, 16#0065#, 16#0020#, 16#0074#, 16#0068#, 16#0061#, 16#0074#, 16#002C#, 16#0020#, 16#0069#, 16#006E#, 16#0020#, 16#0074#, 16#0075#, 16#0072#, 16#006E#, 16#002C#, 16#0020#, 16#0072#, 16#0065#, 16#0073#, 16#0075#, 16#006C#, 16#0074#, 16#0073#, 16#0020#, 16#0069#, 16#006E#, 16#0020#, 16#0074#, 16#0068#, 16#0065#, 16#0020#, 16#0069#, 16#006E#, 16#0076#, 16#006F#, 16#0063#, 16#0061#, 16#0074#, 16#0069#, 16#006F#, 16#006E#, 16#0020#, 16#006F#, 16#0066#, 16#0020#, 16#0074#, 16#0068#, 16#0061#, 16#0074#, 16#0020#, 16#0062#, 16#0065#, 16#0068#, 16#0061#, 16#0076#, 16#0069#, 16#006F#, 16#0072#, 16#002E#, 16#0020#, 16#0054#, 16#0068#, 16#0065#, 16#0020#, 16#0061#, 16#0072#, 16#0067#, 16#0075#, 16#006D#, 16#0065#, 16#006E#, 16#0074#, 16#0020#, 16#0076#, 16#0061#, 16#006C#, 16#0075#, 16#0065#, 16#0073#, 16#0020#, 16#006F#, 16#0066#, 16#0020#, 16#0074#, 16#0068#, 16#0065#, 16#0020#, 16#0061#, 16#0063#, 16#0074#, 16#0069#, 16#006F#, 16#006E#, 16#0020#, 16#0061#, 16#0072#, 16#0065#, 16#0020#, 16#0061#, 16#0076#, 16#0061#, 16#0069#, 16#006C#, 16#0061#, 16#0062#, 16#006C#, 16#0065#, 16#0020#, 16#0074#, 16#006F#, 16#0020#, 16#0074#, 16#0068#, 16#0065#, 16#0020#, 16#0065#, 16#0078#, 16#0065#, 16#0063#, 16#0075#, 16#0074#, 16#0069#, 16#006F#, 16#006E#, 16#0020#, 16#006F#, 16#0066#, 16#0020#, 16#0074#, 16#0068#, 16#0065#, 16#0020#, 16#0069#, 16#006E#, 16#0076#, 16#006F#, 16#006B#, 16#0065#, 16#0064#, 16#0020#, 16#0062#, 16#0065#, 16#0068#, 16#0061#, 16#0076#, 16#0069#, 16#006F#, 16#0072#, 16#002E#, 16#0020#, 16#0046#, 16#006F#, 16#0072#, 16#0020#, 16#0073#, 16#0079#, 16#006E#, 16#0063#, 16#0068#, 16#0072#, 16#006F#, 16#006E#, 16#006F#, 16#0075#, 16#0073#, 16#0020#, 16#0063#, 16#0061#, 16#006C#, 16#006C#, 16#0073#, 16#0020#, 16#0074#, 16#0068#, 16#0065#, 16#0020#, 16#0065#, 16#0078#, 16#0065#, 16#0063#, 16#0075#, 16#0074#, 16#0069#, 16#006F#, 16#006E#, 16#0020#, 16#006F#, 16#0066#, 16#0020#, 16#0074#, 16#0068#, 16#0065#, 16#0020#, 16#0063#, 16#0061#, 16#006C#, 16#006C#, 16#0020#, 16#0062#, 16#0065#, 16#0068#, 16#0061#, 16#0076#, 16#0069#, 16#006F#, 16#0072#, 16#0020#, 16#0061#, 16#0063#, 16#0074#, 16#0069#, 16#006F#, 16#006E#, 16#0020#, 16#0077#, 16#0061#, 16#0069#, 16#0074#, 16#0073#, 16#0020#, 16#0075#, 16#006E#, 16#0074#, 16#0069#, 16#006C#, 16#0020#, 16#0074#, 16#0068#, 16#0065#, 16#0020#, 16#0065#, 16#0078#, 16#0065#, 16#0063#, 16#0075#, 16#0074#, 16#0069#, 16#006F#, 16#006E#, 16#0020#, 16#006F#, 16#0066#, 16#0020#, 16#0074#, 16#0068#, 16#0065#, 16#0020#, 16#0069#, 16#006E#, 16#0076#, 16#006F#, 16#006B#, 16#0065#, 16#0064#, 16#0020#, 16#0062#, 16#0065#, 16#0068#, 16#0061#, 16#0076#, 16#0069#, 16#006F#, 16#0072#, 16#0020#, 16#0063#, 16#006F#, 16#006D#, 16#0070#, 16#006C#, 16#0065#, 16#0074#, 16#0065#, 16#0073#, 16#0020#, 16#0061#, 16#006E#, 16#0064#, 16#0020#, 16#0061#, 16#0020#, 16#0072#, 16#0065#, 16#0073#, 16#0075#, 16#006C#, 16#0074#, 16#0020#, 16#0069#, 16#0073#, 16#0020#, 16#0072#, 16#0065#, 16#0074#, 16#0075#, 16#0072#, 16#006E#, 16#0065#, 16#0064#, 16#0020#, 16#006F#, 16#006E#, 16#0020#, 16#0069#, 16#0074#, 16#0073#, 16#0020#, 16#006F#, 16#0075#, 16#0074#, 16#0070#, 16#0075#, 16#0074#, 16#0020#, 16#0070#, 16#0069#, 16#006E#, 16#002E#, 16#0020#, 16#0054#, 16#0068#, 16#0065#, 16#0020#, 16#0061#, 16#0063#, 16#0074#, 16#0069#, 16#006F#, 16#006E#, 16#0020#, 16#0063#, 16#006F#, 16#006D#, 16#0070#, 16#006C#, 16#0065#, 16#0074#, 16#0065#, 16#0073#, 16#0020#, 16#0069#, 16#006D#, 16#006D#, 16#0065#, 16#0064#, 16#0069#, 16#0061#, 16#0074#, 16#0065#, 16#006C#, 16#0079#, 16#0020#, 16#0077#, 16#0069#, 16#0074#, 16#0068#, 16#006F#, 16#0075#, 16#0074#, 16#0020#, 16#0061#, 16#0020#, 16#0072#, 16#0065#, 16#0073#, 16#0075#, 16#006C#, 16#0074#, 16#002C#, 16#0020#, 16#0069#, 16#0066#, 16#0020#, 16#0074#, 16#0068#, 16#0065#, 16#0020#, 16#0063#, 16#0061#, 16#006C#, 16#006C#, 16#0020#, 16#0069#, 16#0073#, 16#0020#, 16#0061#, 16#0073#, 16#0079#, 16#006E#, 16#0063#, 16#0068#, 16#0072#, 16#006F#, 16#006E#, 16#006F#, 16#0075#, 16#0073#, 16#002E#, 16#0020#, 16#0049#, 16#006E#, 16#0020#, 16#0070#, 16#0061#, 16#0072#, 16#0074#, 16#0069#, 16#0063#, 16#0075#, 16#006C#, 16#0061#, 16#0072#, 16#002C#, 16#0020#, 16#0074#, 16#0068#, 16#0065#, 16#0020#, 16#0069#, 16#006E#, 16#0076#, 16#006F#, 16#006B#, 16#0065#, 16#0064#, 16#0020#, 16#0062#, 16#0065#, 16#0068#, 16#0061#, 16#0076#, 16#0069#, 16#006F#, 16#0072#, 16#0020#, 16#006D#, 16#0061#, 16#0079#, 16#0020#, 16#0062#, 16#0065#, 16#0020#, 16#0061#, 16#006E#, 16#0020#, 16#0061#, 16#0063#, 16#0074#, 16#0069#, 16#0076#, 16#0069#, 16#0074#, 16#0079#, 16#002E#, others => 16#0000#), others => <>); -- "The sources and targets of the information flow must conform with the sources and targets or conversely the targets and sources of the realization relationships." MS_025B : aliased Matreshka.Internals.Strings.Shared_String := (Capacity => 167, Unused => 161, Length => 161, Value => (16#0054#, 16#0068#, 16#0065#, 16#0020#, 16#0073#, 16#006F#, 16#0075#, 16#0072#, 16#0063#, 16#0065#, 16#0073#, 16#0020#, 16#0061#, 16#006E#, 16#0064#, 16#0020#, 16#0074#, 16#0061#, 16#0072#, 16#0067#, 16#0065#, 16#0074#, 16#0073#, 16#0020#, 16#006F#, 16#0066#, 16#0020#, 16#0074#, 16#0068#, 16#0065#, 16#0020#, 16#0069#, 16#006E#, 16#0066#, 16#006F#, 16#0072#, 16#006D#, 16#0061#, 16#0074#, 16#0069#, 16#006F#, 16#006E#, 16#0020#, 16#0066#, 16#006C#, 16#006F#, 16#0077#, 16#0020#, 16#006D#, 16#0075#, 16#0073#, 16#0074#, 16#0020#, 16#0063#, 16#006F#, 16#006E#, 16#0066#, 16#006F#, 16#0072#, 16#006D#, 16#0020#, 16#0077#, 16#0069#, 16#0074#, 16#0068#, 16#0020#, 16#0074#, 16#0068#, 16#0065#, 16#0020#, 16#0073#, 16#006F#, 16#0075#, 16#0072#, 16#0063#, 16#0065#, 16#0073#, 16#0020#, 16#0061#, 16#006E#, 16#0064#, 16#0020#, 16#0074#, 16#0061#, 16#0072#, 16#0067#, 16#0065#, 16#0074#, 16#0073#, 16#0020#, 16#006F#, 16#0072#, 16#0020#, 16#0063#, 16#006F#, 16#006E#, 16#0076#, 16#0065#, 16#0072#, 16#0073#, 16#0065#, 16#006C#, 16#0079#, 16#0020#, 16#0074#, 16#0068#, 16#0065#, 16#0020#, 16#0074#, 16#0061#, 16#0072#, 16#0067#, 16#0065#, 16#0074#, 16#0073#, 16#0020#, 16#0061#, 16#006E#, 16#0064#, 16#0020#, 16#0073#, 16#006F#, 16#0075#, 16#0072#, 16#0063#, 16#0065#, 16#0073#, 16#0020#, 16#006F#, 16#0066#, 16#0020#, 16#0074#, 16#0068#, 16#0065#, 16#0020#, 16#0072#, 16#0065#, 16#0061#, 16#006C#, 16#0069#, 16#007A#, 16#0061#, 16#0074#, 16#0069#, 16#006F#, 16#006E#, 16#0020#, 16#0072#, 16#0065#, 16#006C#, 16#0061#, 16#0074#, 16#0069#, 16#006F#, 16#006E#, 16#0073#, 16#0068#, 16#0069#, 16#0070#, 16#0073#, 16#002E#, others => 16#0000#), others => <>); -- "edge" MS_025C : aliased Matreshka.Internals.Strings.Shared_String := (Capacity => 7, Unused => 4, Length => 4, Value => (16#0065#, 16#0064#, 16#0067#, 16#0065#, others => 16#0000#), others => <>); -- "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." MS_025D : aliased Matreshka.Internals.Strings.Shared_String := (Capacity => 183, Unused => 171, Length => 171, Value => (16#0054#, 16#0068#, 16#0065#, 16#0020#, 16#0071#, 16#0075#, 16#0065#, 16#0072#, 16#0079#, 16#0020#, 16#0069#, 16#006E#, 16#0068#, 16#0065#, 16#0072#, 16#0069#, 16#0074#, 16#0061#, 16#0062#, 16#006C#, 16#0065#, 16#004D#, 16#0065#, 16#006D#, 16#0062#, 16#0065#, 16#0072#, 16#0073#, 16#0028#, 16#0029#, 16#0020#, 16#0067#, 16#0069#, 16#0076#, 16#0065#, 16#0073#, 16#0020#, 16#0061#, 16#006C#, 16#006C#, 16#0020#, 16#006F#, 16#0066#, 16#0020#, 16#0074#, 16#0068#, 16#0065#, 16#0020#, 16#006D#, 16#0065#, 16#006D#, 16#0062#, 16#0065#, 16#0072#, 16#0073#, 16#0020#, 16#006F#, 16#0066#, 16#0020#, 16#0061#, 16#0020#, 16#0063#, 16#006C#, 16#0061#, 16#0073#, 16#0073#, 16#0069#, 16#0066#, 16#0069#, 16#0065#, 16#0072#, 16#0020#, 16#0074#, 16#0068#, 16#0061#, 16#0074#, 16#0020#, 16#006D#, 16#0061#, 16#0079#, 16#0020#, 16#0062#, 16#0065#, 16#0020#, 16#0069#, 16#006E#, 16#0068#, 16#0065#, 16#0072#, 16#0069#, 16#0074#, 16#0065#, 16#0064#, 16#0020#, 16#0069#, 16#006E#, 16#0020#, 16#006F#, 16#006E#, 16#0065#, 16#0020#, 16#006F#, 16#0066#, 16#0020#, 16#0069#, 16#0074#, 16#0073#, 16#0020#, 16#0064#, 16#0065#, 16#0073#, 16#0063#, 16#0065#, 16#006E#, 16#0064#, 16#0061#, 16#006E#, 16#0074#, 16#0073#, 16#002C#, 16#0020#, 16#0073#, 16#0075#, 16#0062#, 16#006A#, 16#0065#, 16#0063#, 16#0074#, 16#0020#, 16#0074#, 16#006F#, 16#0020#, 16#0077#, 16#0068#, 16#0061#, 16#0074#, 16#0065#, 16#0076#, 16#0065#, 16#0072#, 16#0020#, 16#0076#, 16#0069#, 16#0073#, 16#0069#, 16#0062#, 16#0069#, 16#006C#, 16#0069#, 16#0074#, 16#0079#, 16#0020#, 16#0072#, 16#0065#, 16#0073#, 16#0074#, 16#0072#, 16#0069#, 16#0063#, 16#0074#, 16#0069#, 16#006F#, 16#006E#, 16#0073#, 16#0020#, 16#0061#, 16#0070#, 16#0070#, 16#006C#, 16#0079#, 16#002E#, others => 16#0000#), others => <>); -- "If isComposite is true, the object containing the attribute is a container for the object or value contained in the attribute." MS_025E : aliased Matreshka.Internals.Strings.Shared_String := (Capacity => 135, Unused => 126, Length => 126, Value => (16#0049#, 16#0066#, 16#0020#, 16#0069#, 16#0073#, 16#0043#, 16#006F#, 16#006D#, 16#0070#, 16#006F#, 16#0073#, 16#0069#, 16#0074#, 16#0065#, 16#0020#, 16#0069#, 16#0073#, 16#0020#, 16#0074#, 16#0072#, 16#0075#, 16#0065#, 16#002C#, 16#0020#, 16#0074#, 16#0068#, 16#0065#, 16#0020#, 16#006F#, 16#0062#, 16#006A#, 16#0065#, 16#0063#, 16#0074#, 16#0020#, 16#0063#, 16#006F#, 16#006E#, 16#0074#, 16#0061#, 16#0069#, 16#006E#, 16#0069#, 16#006E#, 16#0067#, 16#0020#, 16#0074#, 16#0068#, 16#0065#, 16#0020#, 16#0061#, 16#0074#, 16#0074#, 16#0072#, 16#0069#, 16#0062#, 16#0075#, 16#0074#, 16#0065#, 16#0020#, 16#0069#, 16#0073#, 16#0020#, 16#0061#, 16#0020#, 16#0063#, 16#006F#, 16#006E#, 16#0074#, 16#0061#, 16#0069#, 16#006E#, 16#0065#, 16#0072#, 16#0020#, 16#0066#, 16#006F#, 16#0072#, 16#0020#, 16#0074#, 16#0068#, 16#0065#, 16#0020#, 16#006F#, 16#0062#, 16#006A#, 16#0065#, 16#0063#, 16#0074#, 16#0020#, 16#006F#, 16#0072#, 16#0020#, 16#0076#, 16#0061#, 16#006C#, 16#0075#, 16#0065#, 16#0020#, 16#0063#, 16#006F#, 16#006E#, 16#0074#, 16#0061#, 16#0069#, 16#006E#, 16#0065#, 16#0064#, 16#0020#, 16#0069#, 16#006E#, 16#0020#, 16#0074#, 16#0068#, 16#0065#, 16#0020#, 16#0061#, 16#0074#, 16#0074#, 16#0072#, 16#0069#, 16#0062#, 16#0075#, 16#0074#, 16#0065#, 16#002E#, others => 16#0000#), others => <>); -- "A_informationTarget_informationFlow" MS_025F : aliased Matreshka.Internals.Strings.Shared_String := (Capacity => 39, Unused => 35, Length => 35, Value => (16#0041#, 16#005F#, 16#0069#, 16#006E#, 16#0066#, 16#006F#, 16#0072#, 16#006D#, 16#0061#, 16#0074#, 16#0069#, 16#006F#, 16#006E#, 16#0054#, 16#0061#, 16#0072#, 16#0067#, 16#0065#, 16#0074#, 16#005F#, 16#0069#, 16#006E#, 16#0066#, 16#006F#, 16#0072#, 16#006D#, 16#0061#, 16#0074#, 16#0069#, 16#006F#, 16#006E#, 16#0046#, 16#006C#, 16#006F#, 16#0077#, others => 16#0000#), others => <>); -- "owningTransition" MS_0260 : aliased Matreshka.Internals.Strings.Shared_String := (Capacity => 23, Unused => 16, Length => 16, Value => (16#006F#, 16#0077#, 16#006E#, 16#0069#, 16#006E#, 16#0067#, 16#0054#, 16#0072#, 16#0061#, 16#006E#, 16#0073#, 16#0069#, 16#0074#, 16#0069#, 16#006F#, 16#006E#, others => 16#0000#), others => <>); -- "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." MS_0261 : aliased Matreshka.Internals.Strings.Shared_String := (Capacity => 239, Unused => 232, Length => 232, Value => (16#0054#, 16#0068#, 16#0065#, 16#0020#, 16#0065#, 16#006C#, 16#0065#, 16#006D#, 16#0065#, 16#006E#, 16#0074#, 16#0028#, 16#0073#, 16#0029#, 16#0020#, 16#0064#, 16#0065#, 16#0070#, 16#0065#, 16#006E#, 16#0064#, 16#0065#, 16#006E#, 16#0074#, 16#0020#, 16#006F#, 16#006E#, 16#0020#, 16#0074#, 16#0068#, 16#0065#, 16#0020#, 16#0073#, 16#0075#, 16#0070#, 16#0070#, 16#006C#, 16#0069#, 16#0065#, 16#0072#, 16#0020#, 16#0065#, 16#006C#, 16#0065#, 16#006D#, 16#0065#, 16#006E#, 16#0074#, 16#0028#, 16#0073#, 16#0029#, 16#002E#, 16#0020#, 16#0049#, 16#006E#, 16#0020#, 16#0073#, 16#006F#, 16#006D#, 16#0065#, 16#0020#, 16#0063#, 16#0061#, 16#0073#, 16#0065#, 16#0073#, 16#0020#, 16#0028#, 16#0073#, 16#0075#, 16#0063#, 16#0068#, 16#0020#, 16#0061#, 16#0073#, 16#0020#, 16#0061#, 16#0020#, 16#0054#, 16#0072#, 16#0061#, 16#0063#, 16#0065#, 16#0020#, 16#0041#, 16#0062#, 16#0073#, 16#0074#, 16#0072#, 16#0061#, 16#0063#, 16#0074#, 16#0069#, 16#006F#, 16#006E#, 16#0029#, 16#0020#, 16#0074#, 16#0068#, 16#0065#, 16#0020#, 16#0061#, 16#0073#, 16#0073#, 16#0069#, 16#0067#, 16#006E#, 16#006D#, 16#0065#, 16#006E#, 16#0074#, 16#0020#, 16#006F#, 16#0066#, 16#0020#, 16#0064#, 16#0069#, 16#0072#, 16#0065#, 16#0063#, 16#0074#, 16#0069#, 16#006F#, 16#006E#, 16#0020#, 16#0028#, 16#0074#, 16#0068#, 16#0061#, 16#0074#, 16#0020#, 16#0069#, 16#0073#, 16#002C#, 16#0020#, 16#0074#, 16#0068#, 16#0065#, 16#0020#, 16#0064#, 16#0065#, 16#0073#, 16#0069#, 16#0067#, 16#006E#, 16#0061#, 16#0074#, 16#0069#, 16#006F#, 16#006E#, 16#0020#, 16#006F#, 16#0066#, 16#0020#, 16#0074#, 16#0068#, 16#0065#, 16#0020#, 16#0063#, 16#006C#, 16#0069#, 16#0065#, 16#006E#, 16#0074#, 16#0020#, 16#0065#, 16#006C#, 16#0065#, 16#006D#, 16#0065#, 16#006E#, 16#0074#, 16#0029#, 16#0020#, 16#0069#, 16#0073#, 16#0020#, 16#0061#, 16#0074#, 16#0020#, 16#0074#, 16#0068#, 16#0065#, 16#0020#, 16#0064#, 16#0069#, 16#0073#, 16#0063#, 16#0072#, 16#0065#, 16#0074#, 16#0069#, 16#006F#, 16#006E#, 16#0020#, 16#006F#, 16#0066#, 16#0020#, 16#0074#, 16#0068#, 16#0065#, 16#0020#, 16#006D#, 16#006F#, 16#0064#, 16#0065#, 16#006C#, 16#0065#, 16#0072#, 16#002C#, 16#0020#, 16#0061#, 16#006E#, 16#0064#, 16#0020#, 16#0069#, 16#0073#, 16#0020#, 16#0061#, 16#0020#, 16#0073#, 16#0074#, 16#0069#, 16#0070#, 16#0075#, 16#006C#, 16#0061#, 16#0074#, 16#0069#, 16#006F#, 16#006E#, 16#002E#, others => 16#0000#), others => <>); -- "A_ownedType_package" MS_0262 : aliased Matreshka.Internals.Strings.Shared_String := (Capacity => 23, Unused => 19, Length => 19, Value => (16#0041#, 16#005F#, 16#006F#, 16#0077#, 16#006E#, 16#0065#, 16#0064#, 16#0054#, 16#0079#, 16#0070#, 16#0065#, 16#005F#, 16#0070#, 16#0061#, 16#0063#, 16#006B#, 16#0061#, 16#0067#, 16#0065#, others => 16#0000#), others => <>); -- "AcceptCallAction" MS_0263 : aliased Matreshka.Internals.Strings.Shared_String := (Capacity => 23, Unused => 16, Length => 16, Value => (16#0041#, 16#0063#, 16#0063#, 16#0065#, 16#0070#, 16#0074#, 16#0043#, 16#0061#, 16#006C#, 16#006C#, 16#0041#, 16#0063#, 16#0074#, 16#0069#, 16#006F#, 16#006E#, others => 16#0000#), others => <>); -- "maxint" MS_0264 : aliased Matreshka.Internals.Strings.Shared_String := (Capacity => 7, Unused => 6, Length => 6, Value => (16#006D#, 16#0061#, 16#0078#, 16#0069#, 16#006E#, 16#0074#, others => 16#0000#), others => <>); -- "Observation" MS_0265 : aliased Matreshka.Internals.Strings.Shared_String := (Capacity => 15, Unused => 11, Length => 11, Value => (16#004F#, 16#0062#, 16#0073#, 16#0065#, 16#0072#, 16#0076#, 16#0061#, 16#0074#, 16#0069#, 16#006F#, 16#006E#, others => 16#0000#), others => <>); -- "Specifies whether the Property is derived, i.e., whether its value or values can be computed from other information." MS_0266 : aliased Matreshka.Internals.Strings.Shared_String := (Capacity => 119, Unused => 116, Length => 116, Value => (16#0053#, 16#0070#, 16#0065#, 16#0063#, 16#0069#, 16#0066#, 16#0069#, 16#0065#, 16#0073#, 16#0020#, 16#0077#, 16#0068#, 16#0065#, 16#0074#, 16#0068#, 16#0065#, 16#0072#, 16#0020#, 16#0074#, 16#0068#, 16#0065#, 16#0020#, 16#0050#, 16#0072#, 16#006F#, 16#0070#, 16#0065#, 16#0072#, 16#0074#, 16#0079#, 16#0020#, 16#0069#, 16#0073#, 16#0020#, 16#0064#, 16#0065#, 16#0072#, 16#0069#, 16#0076#, 16#0065#, 16#0064#, 16#002C#, 16#0020#, 16#0069#, 16#002E#, 16#0065#, 16#002E#, 16#002C#, 16#0020#, 16#0077#, 16#0068#, 16#0065#, 16#0074#, 16#0068#, 16#0065#, 16#0072#, 16#0020#, 16#0069#, 16#0074#, 16#0073#, 16#0020#, 16#0076#, 16#0061#, 16#006C#, 16#0075#, 16#0065#, 16#0020#, 16#006F#, 16#0072#, 16#0020#, 16#0076#, 16#0061#, 16#006C#, 16#0075#, 16#0065#, 16#0073#, 16#0020#, 16#0063#, 16#0061#, 16#006E#, 16#0020#, 16#0062#, 16#0065#, 16#0020#, 16#0063#, 16#006F#, 16#006D#, 16#0070#, 16#0075#, 16#0074#, 16#0065#, 16#0064#, 16#0020#, 16#0066#, 16#0072#, 16#006F#, 16#006D#, 16#0020#, 16#006F#, 16#0074#, 16#0068#, 16#0065#, 16#0072#, 16#0020#, 16#0069#, 16#006E#, 16#0066#, 16#006F#, 16#0072#, 16#006D#, 16#0061#, 16#0074#, 16#0069#, 16#006F#, 16#006E#, 16#002E#, others => 16#0000#), others => <>); -- "A_subExpression_owningExpression" MS_0267 : aliased Matreshka.Internals.Strings.Shared_String := (Capacity => 39, Unused => 32, Length => 32, Value => (16#0041#, 16#005F#, 16#0073#, 16#0075#, 16#0062#, 16#0045#, 16#0078#, 16#0070#, 16#0072#, 16#0065#, 16#0073#, 16#0073#, 16#0069#, 16#006F#, 16#006E#, 16#005F#, 16#006F#, 16#0077#, 16#006E#, 16#0069#, 16#006E#, 16#0067#, 16#0045#, 16#0078#, 16#0070#, 16#0072#, 16#0065#, 16#0073#, 16#0073#, 16#0069#, 16#006F#, 16#006E#, others => 16#0000#), others => <>); -- "History vertices can have at most one outgoing transition." MS_0268 : aliased Matreshka.Internals.Strings.Shared_String := (Capacity => 63, Unused => 58, Length => 58, Value => (16#0048#, 16#0069#, 16#0073#, 16#0074#, 16#006F#, 16#0072#, 16#0079#, 16#0020#, 16#0076#, 16#0065#, 16#0072#, 16#0074#, 16#0069#, 16#0063#, 16#0065#, 16#0073#, 16#0020#, 16#0063#, 16#0061#, 16#006E#, 16#0020#, 16#0068#, 16#0061#, 16#0076#, 16#0065#, 16#0020#, 16#0061#, 16#0074#, 16#0020#, 16#006D#, 16#006F#, 16#0073#, 16#0074#, 16#0020#, 16#006F#, 16#006E#, 16#0065#, 16#0020#, 16#006F#, 16#0075#, 16#0074#, 16#0067#, 16#006F#, 16#0069#, 16#006E#, 16#0067#, 16#0020#, 16#0074#, 16#0072#, 16#0061#, 16#006E#, 16#0073#, 16#0069#, 16#0074#, 16#0069#, 16#006F#, 16#006E#, 16#002E#, others => 16#0000#), others => <>); -- "Groups containing the node." MS_0269 : aliased Matreshka.Internals.Strings.Shared_String := (Capacity => 31, Unused => 27, Length => 27, Value => (16#0047#, 16#0072#, 16#006F#, 16#0075#, 16#0070#, 16#0073#, 16#0020#, 16#0063#, 16#006F#, 16#006E#, 16#0074#, 16#0061#, 16#0069#, 16#006E#, 16#0069#, 16#006E#, 16#0067#, 16#0020#, 16#0074#, 16#0068#, 16#0065#, 16#0020#, 16#006E#, 16#006F#, 16#0064#, 16#0065#, 16#002E#, others => 16#0000#), others => <>); -- "The Enumeration that this EnumerationLiteral is a member of." MS_026A : aliased Matreshka.Internals.Strings.Shared_String := (Capacity => 63, Unused => 60, Length => 60, Value => (16#0054#, 16#0068#, 16#0065#, 16#0020#, 16#0045#, 16#006E#, 16#0075#, 16#006D#, 16#0065#, 16#0072#, 16#0061#, 16#0074#, 16#0069#, 16#006F#, 16#006E#, 16#0020#, 16#0074#, 16#0068#, 16#0061#, 16#0074#, 16#0020#, 16#0074#, 16#0068#, 16#0069#, 16#0073#, 16#0020#, 16#0045#, 16#006E#, 16#0075#, 16#006D#, 16#0065#, 16#0072#, 16#0061#, 16#0074#, 16#0069#, 16#006F#, 16#006E#, 16#004C#, 16#0069#, 16#0074#, 16#0065#, 16#0072#, 16#0061#, 16#006C#, 16#0020#, 16#0069#, 16#0073#, 16#0020#, 16#0061#, 16#0020#, 16#006D#, 16#0065#, 16#006D#, 16#0062#, 16#0065#, 16#0072#, 16#0020#, 16#006F#, 16#0066#, 16#002E#, others => 16#0000#), others => <>); -- "specification" MS_026B : aliased Matreshka.Internals.Strings.Shared_String := (Capacity => 15, Unused => 13, Length => 13, Value => (16#0073#, 16#0070#, 16#0065#, 16#0063#, 16#0069#, 16#0066#, 16#0069#, 16#0063#, 16#0061#, 16#0074#, 16#0069#, 16#006F#, 16#006E#, others => 16#0000#), others => <>); -- "constraint" MS_026C : aliased Matreshka.Internals.Strings.Shared_String := (Capacity => 15, Unused => 10, Length => 10, Value => (16#0063#, 16#006F#, 16#006E#, 16#0073#, 16#0074#, 16#0072#, 16#0061#, 16#0069#, 16#006E#, 16#0074#, others => 16#0000#), others => <>); -- "concurrent" MS_026D : aliased Matreshka.Internals.Strings.Shared_String := (Capacity => 15, Unused => 10, Length => 10, Value => (16#0063#, 16#006F#, 16#006E#, 16#0063#, 16#0075#, 16#0072#, 16#0072#, 16#0065#, 16#006E#, 16#0074#, others => 16#0000#), others => <>); -- "changeExpression" MS_026E : aliased Matreshka.Internals.Strings.Shared_String := (Capacity => 23, Unused => 16, Length => 16, Value => (16#0063#, 16#0068#, 16#0061#, 16#006E#, 16#0067#, 16#0065#, 16#0045#, 16#0078#, 16#0070#, 16#0072#, 16#0065#, 16#0073#, 16#0073#, 16#0069#, 16#006F#, 16#006E#, others => 16#0000#), others => <>); -- "readStructuralFeatureAction" MS_026F : aliased Matreshka.Internals.Strings.Shared_String := (Capacity => 31, Unused => 27, Length => 27, Value => (16#0072#, 16#0065#, 16#0061#, 16#0064#, 16#0053#, 16#0074#, 16#0072#, 16#0075#, 16#0063#, 16#0074#, 16#0075#, 16#0072#, 16#0061#, 16#006C#, 16#0046#, 16#0065#, 16#0061#, 16#0074#, 16#0075#, 16#0072#, 16#0065#, 16#0041#, 16#0063#, 16#0074#, 16#0069#, 16#006F#, 16#006E#, others => 16#0000#), others => <>); -- "structuralFeature" MS_0270 : aliased Matreshka.Internals.Strings.Shared_String := (Capacity => 23, Unused => 17, Length => 17, Value => (16#0073#, 16#0074#, 16#0072#, 16#0075#, 16#0063#, 16#0074#, 16#0075#, 16#0072#, 16#0061#, 16#006C#, 16#0046#, 16#0065#, 16#0061#, 16#0074#, 16#0075#, 16#0072#, 16#0065#, others => 16#0000#), others => <>); -- "entry" MS_0271 : aliased Matreshka.Internals.Strings.Shared_String := (Capacity => 7, Unused => 5, Length => 5, Value => (16#0065#, 16#006E#, 16#0074#, 16#0072#, 16#0079#, others => 16#0000#), others => <>); -- "Specifies the namespace that owns the NamedElement." MS_0272 : aliased Matreshka.Internals.Strings.Shared_String := (Capacity => 55, Unused => 51, Length => 51, Value => (16#0053#, 16#0070#, 16#0065#, 16#0063#, 16#0069#, 16#0066#, 16#0069#, 16#0065#, 16#0073#, 16#0020#, 16#0074#, 16#0068#, 16#0065#, 16#0020#, 16#006E#, 16#0061#, 16#006D#, 16#0065#, 16#0073#, 16#0070#, 16#0061#, 16#0063#, 16#0065#, 16#0020#, 16#0074#, 16#0068#, 16#0061#, 16#0074#, 16#0020#, 16#006F#, 16#0077#, 16#006E#, 16#0073#, 16#0020#, 16#0074#, 16#0068#, 16#0065#, 16#0020#, 16#004E#, 16#0061#, 16#006D#, 16#0065#, 16#0064#, 16#0045#, 16#006C#, 16#0065#, 16#006D#, 16#0065#, 16#006E#, 16#0074#, 16#002E#, others => 16#0000#), others => <>); -- "state" MS_0273 : aliased Matreshka.Internals.Strings.Shared_String := (Capacity => 7, Unused => 5, Length => 5, Value => (16#0073#, 16#0074#, 16#0061#, 16#0074#, 16#0065#, others => 16#0000#), others => <>); -- "join_segment_guards" MS_0274 : aliased Matreshka.Internals.Strings.Shared_String := (Capacity => 23, Unused => 19, Length => 19, Value => (16#006A#, 16#006F#, 16#0069#, 16#006E#, 16#005F#, 16#0073#, 16#0065#, 16#0067#, 16#006D#, 16#0065#, 16#006E#, 16#0074#, 16#005F#, 16#0067#, 16#0075#, 16#0061#, 16#0072#, 16#0064#, 16#0073#, others => 16#0000#), others => <>); -- "An element is a constituent of a model. As such, it has the capability of owning other elements." MS_0275 : aliased Matreshka.Internals.Strings.Shared_String := (Capacity => 103, Unused => 96, Length => 96, Value => (16#0041#, 16#006E#, 16#0020#, 16#0065#, 16#006C#, 16#0065#, 16#006D#, 16#0065#, 16#006E#, 16#0074#, 16#0020#, 16#0069#, 16#0073#, 16#0020#, 16#0061#, 16#0020#, 16#0063#, 16#006F#, 16#006E#, 16#0073#, 16#0074#, 16#0069#, 16#0074#, 16#0075#, 16#0065#, 16#006E#, 16#0074#, 16#0020#, 16#006F#, 16#0066#, 16#0020#, 16#0061#, 16#0020#, 16#006D#, 16#006F#, 16#0064#, 16#0065#, 16#006C#, 16#002E#, 16#0020#, 16#0041#, 16#0073#, 16#0020#, 16#0073#, 16#0075#, 16#0063#, 16#0068#, 16#002C#, 16#0020#, 16#0069#, 16#0074#, 16#0020#, 16#0068#, 16#0061#, 16#0073#, 16#0020#, 16#0074#, 16#0068#, 16#0065#, 16#0020#, 16#0063#, 16#0061#, 16#0070#, 16#0061#, 16#0062#, 16#0069#, 16#006C#, 16#0069#, 16#0074#, 16#0079#, 16#0020#, 16#006F#, 16#0066#, 16#0020#, 16#006F#, 16#0077#, 16#006E#, 16#0069#, 16#006E#, 16#0067#, 16#0020#, 16#006F#, 16#0074#, 16#0068#, 16#0065#, 16#0072#, 16#0020#, 16#0065#, 16#006C#, 16#0065#, 16#006D#, 16#0065#, 16#006E#, 16#0074#, 16#0073#, 16#002E#, others => 16#0000#), others => <>); -- "isIndirectlyInstantiated" MS_0276 : aliased Matreshka.Internals.Strings.Shared_String := (Capacity => 31, Unused => 24, Length => 24, Value => (16#0069#, 16#0073#, 16#0049#, 16#006E#, 16#0064#, 16#0069#, 16#0072#, 16#0065#, 16#0063#, 16#0074#, 16#006C#, 16#0079#, 16#0049#, 16#006E#, 16#0073#, 16#0074#, 16#0061#, 16#006E#, 16#0074#, 16#0069#, 16#0061#, 16#0074#, 16#0065#, 16#0064#, others => 16#0000#), others => <>); -- "end" MS_0277 : aliased Matreshka.Internals.Strings.Shared_String := (Capacity => 7, Unused => 3, Length => 3, Value => (16#0065#, 16#006E#, 16#0064#, others => 16#0000#), others => <>); -- "The query upperBound() returns the upper bound of the multiplicity for a bounded multiplicity as an unlimited natural." MS_0278 : aliased Matreshka.Internals.Strings.Shared_String := (Capacity => 127, Unused => 118, Length => 118, Value => (16#0054#, 16#0068#, 16#0065#, 16#0020#, 16#0071#, 16#0075#, 16#0065#, 16#0072#, 16#0079#, 16#0020#, 16#0075#, 16#0070#, 16#0070#, 16#0065#, 16#0072#, 16#0042#, 16#006F#, 16#0075#, 16#006E#, 16#0064#, 16#0028#, 16#0029#, 16#0020#, 16#0072#, 16#0065#, 16#0074#, 16#0075#, 16#0072#, 16#006E#, 16#0073#, 16#0020#, 16#0074#, 16#0068#, 16#0065#, 16#0020#, 16#0075#, 16#0070#, 16#0070#, 16#0065#, 16#0072#, 16#0020#, 16#0062#, 16#006F#, 16#0075#, 16#006E#, 16#0064#, 16#0020#, 16#006F#, 16#0066#, 16#0020#, 16#0074#, 16#0068#, 16#0065#, 16#0020#, 16#006D#, 16#0075#, 16#006C#, 16#0074#, 16#0069#, 16#0070#, 16#006C#, 16#0069#, 16#0063#, 16#0069#, 16#0074#, 16#0079#, 16#0020#, 16#0066#, 16#006F#, 16#0072#, 16#0020#, 16#0061#, 16#0020#, 16#0062#, 16#006F#, 16#0075#, 16#006E#, 16#0064#, 16#0065#, 16#0064#, 16#0020#, 16#006D#, 16#0075#, 16#006C#, 16#0074#, 16#0069#, 16#0070#, 16#006C#, 16#0069#, 16#0063#, 16#0069#, 16#0074#, 16#0079#, 16#0020#, 16#0061#, 16#0073#, 16#0020#, 16#0061#, 16#006E#, 16#0020#, 16#0075#, 16#006E#, 16#006C#, 16#0069#, 16#006D#, 16#0069#, 16#0074#, 16#0065#, 16#0064#, 16#0020#, 16#006E#, 16#0061#, 16#0074#, 16#0075#, 16#0072#, 16#0061#, 16#006C#, 16#002E#, others => 16#0000#), others => <>); -- "Specifies the position of an existing value to remove in ordered nonunique structural features. The type of the pin is UnlimitedNatural, but the value cannot be zero or unlimited." MS_0279 : aliased Matreshka.Internals.Strings.Shared_String := (Capacity => 191, Unused => 179, Length => 179, Value => (16#0053#, 16#0070#, 16#0065#, 16#0063#, 16#0069#, 16#0066#, 16#0069#, 16#0065#, 16#0073#, 16#0020#, 16#0074#, 16#0068#, 16#0065#, 16#0020#, 16#0070#, 16#006F#, 16#0073#, 16#0069#, 16#0074#, 16#0069#, 16#006F#, 16#006E#, 16#0020#, 16#006F#, 16#0066#, 16#0020#, 16#0061#, 16#006E#, 16#0020#, 16#0065#, 16#0078#, 16#0069#, 16#0073#, 16#0074#, 16#0069#, 16#006E#, 16#0067#, 16#0020#, 16#0076#, 16#0061#, 16#006C#, 16#0075#, 16#0065#, 16#0020#, 16#0074#, 16#006F#, 16#0020#, 16#0072#, 16#0065#, 16#006D#, 16#006F#, 16#0076#, 16#0065#, 16#0020#, 16#0069#, 16#006E#, 16#0020#, 16#006F#, 16#0072#, 16#0064#, 16#0065#, 16#0072#, 16#0065#, 16#0064#, 16#0020#, 16#006E#, 16#006F#, 16#006E#, 16#0075#, 16#006E#, 16#0069#, 16#0071#, 16#0075#, 16#0065#, 16#0020#, 16#0073#, 16#0074#, 16#0072#, 16#0075#, 16#0063#, 16#0074#, 16#0075#, 16#0072#, 16#0061#, 16#006C#, 16#0020#, 16#0066#, 16#0065#, 16#0061#, 16#0074#, 16#0075#, 16#0072#, 16#0065#, 16#0073#, 16#002E#, 16#0020#, 16#0054#, 16#0068#, 16#0065#, 16#0020#, 16#0074#, 16#0079#, 16#0070#, 16#0065#, 16#0020#, 16#006F#, 16#0066#, 16#0020#, 16#0074#, 16#0068#, 16#0065#, 16#0020#, 16#0070#, 16#0069#, 16#006E#, 16#0020#, 16#0069#, 16#0073#, 16#0020#, 16#0055#, 16#006E#, 16#006C#, 16#0069#, 16#006D#, 16#0069#, 16#0074#, 16#0065#, 16#0064#, 16#004E#, 16#0061#, 16#0074#, 16#0075#, 16#0072#, 16#0061#, 16#006C#, 16#002C#, 16#0020#, 16#0062#, 16#0075#, 16#0074#, 16#0020#, 16#0074#, 16#0068#, 16#0065#, 16#0020#, 16#0076#, 16#0061#, 16#006C#, 16#0075#, 16#0065#, 16#0020#, 16#0063#, 16#0061#, 16#006E#, 16#006E#, 16#006F#, 16#0074#, 16#0020#, 16#0062#, 16#0065#, 16#0020#, 16#007A#, 16#0065#, 16#0072#, 16#006F#, 16#0020#, 16#006F#, 16#0072#, 16#0020#, 16#0075#, 16#006E#, 16#006C#, 16#0069#, 16#006D#, 16#0069#, 16#0074#, 16#0065#, 16#0064#, 16#002E#, others => 16#0000#), others => <>); -- "considerIgnoreFragment" MS_027A : aliased Matreshka.Internals.Strings.Shared_String := (Capacity => 23, Unused => 22, Length => 22, Value => (16#0063#, 16#006F#, 16#006E#, 16#0073#, 16#0069#, 16#0064#, 16#0065#, 16#0072#, 16#0049#, 16#0067#, 16#006E#, 16#006F#, 16#0072#, 16#0065#, 16#0046#, 16#0072#, 16#0061#, 16#0067#, 16#006D#, 16#0065#, 16#006E#, 16#0074#, others => 16#0000#), others => <>); -- "Holds the object to be reclassified." MS_027B : aliased Matreshka.Internals.Strings.Shared_String := (Capacity => 39, Unused => 36, Length => 36, Value => (16#0048#, 16#006F#, 16#006C#, 16#0064#, 16#0073#, 16#0020#, 16#0074#, 16#0068#, 16#0065#, 16#0020#, 16#006F#, 16#0062#, 16#006A#, 16#0065#, 16#0063#, 16#0074#, 16#0020#, 16#0074#, 16#006F#, 16#0020#, 16#0062#, 16#0065#, 16#0020#, 16#0072#, 16#0065#, 16#0063#, 16#006C#, 16#0061#, 16#0073#, 16#0073#, 16#0069#, 16#0066#, 16#0069#, 16#0065#, 16#0064#, 16#002E#, others => 16#0000#), others => <>); -- "Port.aggregation must be composite." MS_027C : aliased Matreshka.Internals.Strings.Shared_String := (Capacity => 39, Unused => 35, Length => 35, Value => (16#0050#, 16#006F#, 16#0072#, 16#0074#, 16#002E#, 16#0061#, 16#0067#, 16#0067#, 16#0072#, 16#0065#, 16#0067#, 16#0061#, 16#0074#, 16#0069#, 16#006F#, 16#006E#, 16#0020#, 16#006D#, 16#0075#, 16#0073#, 16#0074#, 16#0020#, 16#0062#, 16#0065#, 16#0020#, 16#0063#, 16#006F#, 16#006D#, 16#0070#, 16#006F#, 16#0073#, 16#0069#, 16#0074#, 16#0065#, 16#002E#, others => 16#0000#), others => <>); -- "inputValue" MS_027D : aliased Matreshka.Internals.Strings.Shared_String := (Capacity => 15, Unused => 10, Length => 10, Value => (16#0069#, 16#006E#, 16#0070#, 16#0075#, 16#0074#, 16#0056#, 16#0061#, 16#006C#, 16#0075#, 16#0065#, others => 16#0000#), others => <>); -- "Multiple invocations of a behavioral feature may occur simultaneously to one instance, but only one is allowed to commence. The others are blocked until the performance of the currently executing behavioral feature is complete. It is the responsibility of the system designer to ensure that deadlocks do not occur due to simultaneous blocks." MS_027E : aliased Matreshka.Internals.Strings.Shared_String := (Capacity => 351, Unused => 341, Length => 341, Value => (16#004D#, 16#0075#, 16#006C#, 16#0074#, 16#0069#, 16#0070#, 16#006C#, 16#0065#, 16#0020#, 16#0069#, 16#006E#, 16#0076#, 16#006F#, 16#0063#, 16#0061#, 16#0074#, 16#0069#, 16#006F#, 16#006E#, 16#0073#, 16#0020#, 16#006F#, 16#0066#, 16#0020#, 16#0061#, 16#0020#, 16#0062#, 16#0065#, 16#0068#, 16#0061#, 16#0076#, 16#0069#, 16#006F#, 16#0072#, 16#0061#, 16#006C#, 16#0020#, 16#0066#, 16#0065#, 16#0061#, 16#0074#, 16#0075#, 16#0072#, 16#0065#, 16#0020#, 16#006D#, 16#0061#, 16#0079#, 16#0020#, 16#006F#, 16#0063#, 16#0063#, 16#0075#, 16#0072#, 16#0020#, 16#0073#, 16#0069#, 16#006D#, 16#0075#, 16#006C#, 16#0074#, 16#0061#, 16#006E#, 16#0065#, 16#006F#, 16#0075#, 16#0073#, 16#006C#, 16#0079#, 16#0020#, 16#0074#, 16#006F#, 16#0020#, 16#006F#, 16#006E#, 16#0065#, 16#0020#, 16#0069#, 16#006E#, 16#0073#, 16#0074#, 16#0061#, 16#006E#, 16#0063#, 16#0065#, 16#002C#, 16#0020#, 16#0062#, 16#0075#, 16#0074#, 16#0020#, 16#006F#, 16#006E#, 16#006C#, 16#0079#, 16#0020#, 16#006F#, 16#006E#, 16#0065#, 16#0020#, 16#0069#, 16#0073#, 16#0020#, 16#0061#, 16#006C#, 16#006C#, 16#006F#, 16#0077#, 16#0065#, 16#0064#, 16#0020#, 16#0074#, 16#006F#, 16#0020#, 16#0063#, 16#006F#, 16#006D#, 16#006D#, 16#0065#, 16#006E#, 16#0063#, 16#0065#, 16#002E#, 16#0020#, 16#0054#, 16#0068#, 16#0065#, 16#0020#, 16#006F#, 16#0074#, 16#0068#, 16#0065#, 16#0072#, 16#0073#, 16#0020#, 16#0061#, 16#0072#, 16#0065#, 16#0020#, 16#0062#, 16#006C#, 16#006F#, 16#0063#, 16#006B#, 16#0065#, 16#0064#, 16#0020#, 16#0075#, 16#006E#, 16#0074#, 16#0069#, 16#006C#, 16#0020#, 16#0074#, 16#0068#, 16#0065#, 16#0020#, 16#0070#, 16#0065#, 16#0072#, 16#0066#, 16#006F#, 16#0072#, 16#006D#, 16#0061#, 16#006E#, 16#0063#, 16#0065#, 16#0020#, 16#006F#, 16#0066#, 16#0020#, 16#0074#, 16#0068#, 16#0065#, 16#0020#, 16#0063#, 16#0075#, 16#0072#, 16#0072#, 16#0065#, 16#006E#, 16#0074#, 16#006C#, 16#0079#, 16#0020#, 16#0065#, 16#0078#, 16#0065#, 16#0063#, 16#0075#, 16#0074#, 16#0069#, 16#006E#, 16#0067#, 16#0020#, 16#0062#, 16#0065#, 16#0068#, 16#0061#, 16#0076#, 16#0069#, 16#006F#, 16#0072#, 16#0061#, 16#006C#, 16#0020#, 16#0066#, 16#0065#, 16#0061#, 16#0074#, 16#0075#, 16#0072#, 16#0065#, 16#0020#, 16#0069#, 16#0073#, 16#0020#, 16#0063#, 16#006F#, 16#006D#, 16#0070#, 16#006C#, 16#0065#, 16#0074#, 16#0065#, 16#002E#, 16#0020#, 16#0049#, 16#0074#, 16#0020#, 16#0069#, 16#0073#, 16#0020#, 16#0074#, 16#0068#, 16#0065#, 16#0020#, 16#0072#, 16#0065#, 16#0073#, 16#0070#, 16#006F#, 16#006E#, 16#0073#, 16#0069#, 16#0062#, 16#0069#, 16#006C#, 16#0069#, 16#0074#, 16#0079#, 16#0020#, 16#006F#, 16#0066#, 16#0020#, 16#0074#, 16#0068#, 16#0065#, 16#0020#, 16#0073#, 16#0079#, 16#0073#, 16#0074#, 16#0065#, 16#006D#, 16#0020#, 16#0064#, 16#0065#, 16#0073#, 16#0069#, 16#0067#, 16#006E#, 16#0065#, 16#0072#, 16#0020#, 16#0074#, 16#006F#, 16#0020#, 16#0065#, 16#006E#, 16#0073#, 16#0075#, 16#0072#, 16#0065#, 16#0020#, 16#0074#, 16#0068#, 16#0061#, 16#0074#, 16#0020#, 16#0064#, 16#0065#, 16#0061#, 16#0064#, 16#006C#, 16#006F#, 16#0063#, 16#006B#, 16#0073#, 16#0020#, 16#0064#, 16#006F#, 16#0020#, 16#006E#, 16#006F#, 16#0074#, 16#0020#, 16#006F#, 16#0063#, 16#0063#, 16#0075#, 16#0072#, 16#0020#, 16#0064#, 16#0075#, 16#0065#, 16#0020#, 16#0074#, 16#006F#, 16#0020#, 16#0073#, 16#0069#, 16#006D#, 16#0075#, 16#006C#, 16#0074#, 16#0061#, 16#006E#, 16#0065#, 16#006F#, 16#0075#, 16#0073#, 16#0020#, 16#0062#, 16#006C#, 16#006F#, 16#0063#, 16#006B#, 16#0073#, 16#002E#, others => 16#0000#), others => <>); -- "Tells whether the behavior can be invoked while it is still executing from a previous invocation." MS_027F : aliased Matreshka.Internals.Strings.Shared_String := (Capacity => 103, Unused => 97, Length => 97, Value => (16#0054#, 16#0065#, 16#006C#, 16#006C#, 16#0073#, 16#0020#, 16#0077#, 16#0068#, 16#0065#, 16#0074#, 16#0068#, 16#0065#, 16#0072#, 16#0020#, 16#0074#, 16#0068#, 16#0065#, 16#0020#, 16#0062#, 16#0065#, 16#0068#, 16#0061#, 16#0076#, 16#0069#, 16#006F#, 16#0072#, 16#0020#, 16#0063#, 16#0061#, 16#006E#, 16#0020#, 16#0062#, 16#0065#, 16#0020#, 16#0069#, 16#006E#, 16#0076#, 16#006F#, 16#006B#, 16#0065#, 16#0064#, 16#0020#, 16#0077#, 16#0068#, 16#0069#, 16#006C#, 16#0065#, 16#0020#, 16#0069#, 16#0074#, 16#0020#, 16#0069#, 16#0073#, 16#0020#, 16#0073#, 16#0074#, 16#0069#, 16#006C#, 16#006C#, 16#0020#, 16#0065#, 16#0078#, 16#0065#, 16#0063#, 16#0075#, 16#0074#, 16#0069#, 16#006E#, 16#0067#, 16#0020#, 16#0066#, 16#0072#, 16#006F#, 16#006D#, 16#0020#, 16#0061#, 16#0020#, 16#0070#, 16#0072#, 16#0065#, 16#0076#, 16#0069#, 16#006F#, 16#0075#, 16#0073#, 16#0020#, 16#0069#, 16#006E#, 16#0076#, 16#006F#, 16#0063#, 16#0061#, 16#0074#, 16#0069#, 16#006F#, 16#006E#, 16#002E#, others => 16#0000#), others => <>); -- "The element that is bound by this binding." MS_0280 : aliased Matreshka.Internals.Strings.Shared_String := (Capacity => 47, Unused => 42, Length => 42, Value => (16#0054#, 16#0068#, 16#0065#, 16#0020#, 16#0065#, 16#006C#, 16#0065#, 16#006D#, 16#0065#, 16#006E#, 16#0074#, 16#0020#, 16#0074#, 16#0068#, 16#0061#, 16#0074#, 16#0020#, 16#0069#, 16#0073#, 16#0020#, 16#0062#, 16#006F#, 16#0075#, 16#006E#, 16#0064#, 16#0020#, 16#0062#, 16#0079#, 16#0020#, 16#0074#, 16#0068#, 16#0069#, 16#0073#, 16#0020#, 16#0062#, 16#0069#, 16#006E#, 16#0064#, 16#0069#, 16#006E#, 16#0067#, 16#002E#, others => 16#0000#), others => <>); -- "If this operation has a return parameter, isOrdered equals the value of isOrdered for that parameter. Otherwise isOrdered is false." MS_0281 : aliased Matreshka.Internals.Strings.Shared_String := (Capacity => 135, Unused => 131, Length => 131, Value => (16#0049#, 16#0066#, 16#0020#, 16#0074#, 16#0068#, 16#0069#, 16#0073#, 16#0020#, 16#006F#, 16#0070#, 16#0065#, 16#0072#, 16#0061#, 16#0074#, 16#0069#, 16#006F#, 16#006E#, 16#0020#, 16#0068#, 16#0061#, 16#0073#, 16#0020#, 16#0061#, 16#0020#, 16#0072#, 16#0065#, 16#0074#, 16#0075#, 16#0072#, 16#006E#, 16#0020#, 16#0070#, 16#0061#, 16#0072#, 16#0061#, 16#006D#, 16#0065#, 16#0074#, 16#0065#, 16#0072#, 16#002C#, 16#0020#, 16#0069#, 16#0073#, 16#004F#, 16#0072#, 16#0064#, 16#0065#, 16#0072#, 16#0065#, 16#0064#, 16#0020#, 16#0065#, 16#0071#, 16#0075#, 16#0061#, 16#006C#, 16#0073#, 16#0020#, 16#0074#, 16#0068#, 16#0065#, 16#0020#, 16#0076#, 16#0061#, 16#006C#, 16#0075#, 16#0065#, 16#0020#, 16#006F#, 16#0066#, 16#0020#, 16#0069#, 16#0073#, 16#004F#, 16#0072#, 16#0064#, 16#0065#, 16#0072#, 16#0065#, 16#0064#, 16#0020#, 16#0066#, 16#006F#, 16#0072#, 16#0020#, 16#0074#, 16#0068#, 16#0061#, 16#0074#, 16#0020#, 16#0070#, 16#0061#, 16#0072#, 16#0061#, 16#006D#, 16#0065#, 16#0074#, 16#0065#, 16#0072#, 16#002E#, 16#0020#, 16#004F#, 16#0074#, 16#0068#, 16#0065#, 16#0072#, 16#0077#, 16#0069#, 16#0073#, 16#0065#, 16#0020#, 16#0069#, 16#0073#, 16#004F#, 16#0072#, 16#0064#, 16#0065#, 16#0072#, 16#0065#, 16#0064#, 16#0020#, 16#0069#, 16#0073#, 16#0020#, 16#0066#, 16#0061#, 16#006C#, 16#0073#, 16#0065#, 16#002E#, others => 16#0000#), others => <>); -- "Specifies the action in one or more languages." MS_0282 : aliased Matreshka.Internals.Strings.Shared_String := (Capacity => 47, Unused => 46, Length => 46, Value => (16#0053#, 16#0070#, 16#0065#, 16#0063#, 16#0069#, 16#0066#, 16#0069#, 16#0065#, 16#0073#, 16#0020#, 16#0074#, 16#0068#, 16#0065#, 16#0020#, 16#0061#, 16#0063#, 16#0074#, 16#0069#, 16#006F#, 16#006E#, 16#0020#, 16#0069#, 16#006E#, 16#0020#, 16#006F#, 16#006E#, 16#0065#, 16#0020#, 16#006F#, 16#0072#, 16#0020#, 16#006D#, 16#006F#, 16#0072#, 16#0065#, 16#0020#, 16#006C#, 16#0061#, 16#006E#, 16#0067#, 16#0075#, 16#0061#, 16#0067#, 16#0065#, 16#0073#, 16#002E#, others => 16#0000#), others => <>); -- "The model element that is utilized in the manifestation in an Artifact." MS_0283 : aliased Matreshka.Internals.Strings.Shared_String := (Capacity => 79, Unused => 71, Length => 71, Value => (16#0054#, 16#0068#, 16#0065#, 16#0020#, 16#006D#, 16#006F#, 16#0064#, 16#0065#, 16#006C#, 16#0020#, 16#0065#, 16#006C#, 16#0065#, 16#006D#, 16#0065#, 16#006E#, 16#0074#, 16#0020#, 16#0074#, 16#0068#, 16#0061#, 16#0074#, 16#0020#, 16#0069#, 16#0073#, 16#0020#, 16#0075#, 16#0074#, 16#0069#, 16#006C#, 16#0069#, 16#007A#, 16#0065#, 16#0064#, 16#0020#, 16#0069#, 16#006E#, 16#0020#, 16#0074#, 16#0068#, 16#0065#, 16#0020#, 16#006D#, 16#0061#, 16#006E#, 16#0069#, 16#0066#, 16#0065#, 16#0073#, 16#0074#, 16#0061#, 16#0074#, 16#0069#, 16#006F#, 16#006E#, 16#0020#, 16#0069#, 16#006E#, 16#0020#, 16#0061#, 16#006E#, 16#0020#, 16#0041#, 16#0072#, 16#0074#, 16#0069#, 16#0066#, 16#0061#, 16#0063#, 16#0074#, 16#002E#, others => 16#0000#), others => <>); -- "includesCardinality" MS_0284 : aliased Matreshka.Internals.Strings.Shared_String := (Capacity => 23, Unused => 19, Length => 19, Value => (16#0069#, 16#006E#, 16#0063#, 16#006C#, 16#0075#, 16#0064#, 16#0065#, 16#0073#, 16#0043#, 16#0061#, 16#0072#, 16#0064#, 16#0069#, 16#006E#, 16#0061#, 16#006C#, 16#0069#, 16#0074#, 16#0079#, others => 16#0000#), others => <>); -- "PseudostateKind is an enumeration type." MS_0285 : aliased Matreshka.Internals.Strings.Shared_String := (Capacity => 47, Unused => 39, Length => 39, Value => (16#0050#, 16#0073#, 16#0065#, 16#0075#, 16#0064#, 16#006F#, 16#0073#, 16#0074#, 16#0061#, 16#0074#, 16#0065#, 16#004B#, 16#0069#, 16#006E#, 16#0064#, 16#0020#, 16#0069#, 16#0073#, 16#0020#, 16#0061#, 16#006E#, 16#0020#, 16#0065#, 16#006E#, 16#0075#, 16#006D#, 16#0065#, 16#0072#, 16#0061#, 16#0074#, 16#0069#, 16#006F#, 16#006E#, 16#0020#, 16#0074#, 16#0079#, 16#0070#, 16#0065#, 16#002E#, others => 16#0000#), others => <>); -- "represents_part_and_is_contained" MS_0286 : aliased Matreshka.Internals.Strings.Shared_String := (Capacity => 39, Unused => 32, Length => 32, Value => (16#0072#, 16#0065#, 16#0070#, 16#0072#, 16#0065#, 16#0073#, 16#0065#, 16#006E#, 16#0074#, 16#0073#, 16#005F#, 16#0070#, 16#0061#, 16#0072#, 16#0074#, 16#005F#, 16#0061#, 16#006E#, 16#0064#, 16#005F#, 16#0069#, 16#0073#, 16#005F#, 16#0063#, 16#006F#, 16#006E#, 16#0074#, 16#0061#, 16#0069#, 16#006E#, 16#0065#, 16#0064#, others => 16#0000#), others => <>); -- "Missing derivation for Namespace::/ownedMember : NamedElement" MS_0287 : aliased Matreshka.Internals.Strings.Shared_String := (Capacity => 63, Unused => 61, Length => 61, Value => (16#004D#, 16#0069#, 16#0073#, 16#0073#, 16#0069#, 16#006E#, 16#0067#, 16#0020#, 16#0064#, 16#0065#, 16#0072#, 16#0069#, 16#0076#, 16#0061#, 16#0074#, 16#0069#, 16#006F#, 16#006E#, 16#0020#, 16#0066#, 16#006F#, 16#0072#, 16#0020#, 16#004E#, 16#0061#, 16#006D#, 16#0065#, 16#0073#, 16#0070#, 16#0061#, 16#0063#, 16#0065#, 16#003A#, 16#003A#, 16#002F#, 16#006F#, 16#0077#, 16#006E#, 16#0065#, 16#0064#, 16#004D#, 16#0065#, 16#006D#, 16#0062#, 16#0065#, 16#0072#, 16#0020#, 16#003A#, 16#0020#, 16#004E#, 16#0061#, 16#006D#, 16#0065#, 16#0064#, 16#0045#, 16#006C#, 16#0065#, 16#006D#, 16#0065#, 16#006E#, 16#0074#, others => 16#0000#), others => <>); -- "StateMachine" MS_0288 : aliased Matreshka.Internals.Strings.Shared_String := (Capacity => 15, Unused => 12, Length => 12, Value => (16#0053#, 16#0074#, 16#0061#, 16#0074#, 16#0065#, 16#004D#, 16#0061#, 16#0063#, 16#0068#, 16#0069#, 16#006E#, 16#0065#, others => 16#0000#), others => <>); -- "inGroup" MS_0289 : aliased Matreshka.Internals.Strings.Shared_String := (Capacity => 15, Unused => 7, Length => 7, Value => (16#0069#, 16#006E#, 16#0047#, 16#0072#, 16#006F#, 16#0075#, 16#0070#, others => 16#0000#), others => <>); -- "A_value_owningSlot" MS_028A : aliased Matreshka.Internals.Strings.Shared_String := (Capacity => 23, Unused => 18, Length => 18, Value => (16#0041#, 16#005F#, 16#0076#, 16#0061#, 16#006C#, 16#0075#, 16#0065#, 16#005F#, 16#006F#, 16#0077#, 16#006E#, 16#0069#, 16#006E#, 16#0067#, 16#0053#, 16#006C#, 16#006F#, 16#0074#, others => 16#0000#), others => <>); -- "A link end destruction data is not an action. It is an element that identifies links. It identifies one end of a link to be destroyed by destroy link action." MS_028B : aliased Matreshka.Internals.Strings.Shared_String := (Capacity => 167, Unused => 157, Length => 157, Value => (16#0041#, 16#0020#, 16#006C#, 16#0069#, 16#006E#, 16#006B#, 16#0020#, 16#0065#, 16#006E#, 16#0064#, 16#0020#, 16#0064#, 16#0065#, 16#0073#, 16#0074#, 16#0072#, 16#0075#, 16#0063#, 16#0074#, 16#0069#, 16#006F#, 16#006E#, 16#0020#, 16#0064#, 16#0061#, 16#0074#, 16#0061#, 16#0020#, 16#0069#, 16#0073#, 16#0020#, 16#006E#, 16#006F#, 16#0074#, 16#0020#, 16#0061#, 16#006E#, 16#0020#, 16#0061#, 16#0063#, 16#0074#, 16#0069#, 16#006F#, 16#006E#, 16#002E#, 16#0020#, 16#0049#, 16#0074#, 16#0020#, 16#0069#, 16#0073#, 16#0020#, 16#0061#, 16#006E#, 16#0020#, 16#0065#, 16#006C#, 16#0065#, 16#006D#, 16#0065#, 16#006E#, 16#0074#, 16#0020#, 16#0074#, 16#0068#, 16#0061#, 16#0074#, 16#0020#, 16#0069#, 16#0064#, 16#0065#, 16#006E#, 16#0074#, 16#0069#, 16#0066#, 16#0069#, 16#0065#, 16#0073#, 16#0020#, 16#006C#, 16#0069#, 16#006E#, 16#006B#, 16#0073#, 16#002E#, 16#0020#, 16#0049#, 16#0074#, 16#0020#, 16#0069#, 16#0064#, 16#0065#, 16#006E#, 16#0074#, 16#0069#, 16#0066#, 16#0069#, 16#0065#, 16#0073#, 16#0020#, 16#006F#, 16#006E#, 16#0065#, 16#0020#, 16#0065#, 16#006E#, 16#0064#, 16#0020#, 16#006F#, 16#0066#, 16#0020#, 16#0061#, 16#0020#, 16#006C#, 16#0069#, 16#006E#, 16#006B#, 16#0020#, 16#0074#, 16#006F#, 16#0020#, 16#0062#, 16#0065#, 16#0020#, 16#0064#, 16#0065#, 16#0073#, 16#0074#, 16#0072#, 16#006F#, 16#0079#, 16#0065#, 16#0064#, 16#0020#, 16#0062#, 16#0079#, 16#0020#, 16#0064#, 16#0065#, 16#0073#, 16#0074#, 16#0072#, 16#006F#, 16#0079#, 16#0020#, 16#006C#, 16#0069#, 16#006E#, 16#006B#, 16#0020#, 16#0061#, 16#0063#, 16#0074#, 16#0069#, 16#006F#, 16#006E#, 16#002E#, others => 16#0000#), others => <>); -- "must_conform" MS_028C : aliased Matreshka.Internals.Strings.Shared_String := (Capacity => 15, Unused => 12, Length => 12, Value => (16#006D#, 16#0075#, 16#0073#, 16#0074#, 16#005F#, 16#0063#, 16#006F#, 16#006E#, 16#0066#, 16#006F#, 16#0072#, 16#006D#, others => 16#0000#), others => <>); -- "source" MS_028D : aliased Matreshka.Internals.Strings.Shared_String := (Capacity => 7, Unused => 6, Length => 6, Value => (16#0073#, 16#006F#, 16#0075#, 16#0072#, 16#0063#, 16#0065#, others => 16#0000#), others => <>); -- "Only in and inout parameters may have a delete effect. Only out, inout, and return parameters may have a create effect." MS_028E : aliased Matreshka.Internals.Strings.Shared_String := (Capacity => 127, Unused => 119, Length => 119, Value => (16#004F#, 16#006E#, 16#006C#, 16#0079#, 16#0020#, 16#0069#, 16#006E#, 16#0020#, 16#0061#, 16#006E#, 16#0064#, 16#0020#, 16#0069#, 16#006E#, 16#006F#, 16#0075#, 16#0074#, 16#0020#, 16#0070#, 16#0061#, 16#0072#, 16#0061#, 16#006D#, 16#0065#, 16#0074#, 16#0065#, 16#0072#, 16#0073#, 16#0020#, 16#006D#, 16#0061#, 16#0079#, 16#0020#, 16#0068#, 16#0061#, 16#0076#, 16#0065#, 16#0020#, 16#0061#, 16#0020#, 16#0064#, 16#0065#, 16#006C#, 16#0065#, 16#0074#, 16#0065#, 16#0020#, 16#0065#, 16#0066#, 16#0066#, 16#0065#, 16#0063#, 16#0074#, 16#002E#, 16#0020#, 16#004F#, 16#006E#, 16#006C#, 16#0079#, 16#0020#, 16#006F#, 16#0075#, 16#0074#, 16#002C#, 16#0020#, 16#0069#, 16#006E#, 16#006F#, 16#0075#, 16#0074#, 16#002C#, 16#0020#, 16#0061#, 16#006E#, 16#0064#, 16#0020#, 16#0072#, 16#0065#, 16#0074#, 16#0075#, 16#0072#, 16#006E#, 16#0020#, 16#0070#, 16#0061#, 16#0072#, 16#0061#, 16#006D#, 16#0065#, 16#0074#, 16#0065#, 16#0072#, 16#0073#, 16#0020#, 16#006D#, 16#0061#, 16#0079#, 16#0020#, 16#0068#, 16#0061#, 16#0076#, 16#0065#, 16#0020#, 16#0061#, 16#0020#, 16#0063#, 16#0072#, 16#0065#, 16#0061#, 16#0074#, 16#0065#, 16#0020#, 16#0065#, 16#0066#, 16#0066#, 16#0065#, 16#0063#, 16#0074#, 16#002E#, others => 16#0000#), others => <>); -- "The type and ordering of each result output pin must be the same as the corresponding structural feature of the unmarshall classifier." MS_028F : aliased Matreshka.Internals.Strings.Shared_String := (Capacity => 143, Unused => 134, Length => 134, Value => (16#0054#, 16#0068#, 16#0065#, 16#0020#, 16#0074#, 16#0079#, 16#0070#, 16#0065#, 16#0020#, 16#0061#, 16#006E#, 16#0064#, 16#0020#, 16#006F#, 16#0072#, 16#0064#, 16#0065#, 16#0072#, 16#0069#, 16#006E#, 16#0067#, 16#0020#, 16#006F#, 16#0066#, 16#0020#, 16#0065#, 16#0061#, 16#0063#, 16#0068#, 16#0020#, 16#0072#, 16#0065#, 16#0073#, 16#0075#, 16#006C#, 16#0074#, 16#0020#, 16#006F#, 16#0075#, 16#0074#, 16#0070#, 16#0075#, 16#0074#, 16#0020#, 16#0070#, 16#0069#, 16#006E#, 16#0020#, 16#006D#, 16#0075#, 16#0073#, 16#0074#, 16#0020#, 16#0062#, 16#0065#, 16#0020#, 16#0074#, 16#0068#, 16#0065#, 16#0020#, 16#0073#, 16#0061#, 16#006D#, 16#0065#, 16#0020#, 16#0061#, 16#0073#, 16#0020#, 16#0074#, 16#0068#, 16#0065#, 16#0020#, 16#0063#, 16#006F#, 16#0072#, 16#0072#, 16#0065#, 16#0073#, 16#0070#, 16#006F#, 16#006E#, 16#0064#, 16#0069#, 16#006E#, 16#0067#, 16#0020#, 16#0073#, 16#0074#, 16#0072#, 16#0075#, 16#0063#, 16#0074#, 16#0075#, 16#0072#, 16#0061#, 16#006C#, 16#0020#, 16#0066#, 16#0065#, 16#0061#, 16#0074#, 16#0075#, 16#0072#, 16#0065#, 16#0020#, 16#006F#, 16#0066#, 16#0020#, 16#0074#, 16#0068#, 16#0065#, 16#0020#, 16#0075#, 16#006E#, 16#006D#, 16#0061#, 16#0072#, 16#0073#, 16#0068#, 16#0061#, 16#006C#, 16#006C#, 16#0020#, 16#0063#, 16#006C#, 16#0061#, 16#0073#, 16#0073#, 16#0069#, 16#0066#, 16#0069#, 16#0065#, 16#0072#, 16#002E#, others => 16#0000#), others => <>); -- "The multiplicity of ExtensionEnd is 0..1 or 1." MS_0290 : aliased Matreshka.Internals.Strings.Shared_String := (Capacity => 47, Unused => 46, Length => 46, Value => (16#0054#, 16#0068#, 16#0065#, 16#0020#, 16#006D#, 16#0075#, 16#006C#, 16#0074#, 16#0069#, 16#0070#, 16#006C#, 16#0069#, 16#0063#, 16#0069#, 16#0074#, 16#0079#, 16#0020#, 16#006F#, 16#0066#, 16#0020#, 16#0045#, 16#0078#, 16#0074#, 16#0065#, 16#006E#, 16#0073#, 16#0069#, 16#006F#, 16#006E#, 16#0045#, 16#006E#, 16#0064#, 16#0020#, 16#0069#, 16#0073#, 16#0020#, 16#0030#, 16#002E#, 16#002E#, 16#0031#, 16#0020#, 16#006F#, 16#0072#, 16#0020#, 16#0031#, 16#002E#, others => 16#0000#), others => <>); -- "minint_and_maxint" MS_0291 : aliased Matreshka.Internals.Strings.Shared_String := (Capacity => 23, Unused => 17, Length => 17, Value => (16#006D#, 16#0069#, 16#006E#, 16#0069#, 16#006E#, 16#0074#, 16#005F#, 16#0061#, 16#006E#, 16#0064#, 16#005F#, 16#006D#, 16#0061#, 16#0078#, 16#0069#, 16#006E#, 16#0074#, others => 16#0000#), others => <>); -- "A protocol state machine must only have a classifier context, not a behavioral feature context." MS_0292 : aliased Matreshka.Internals.Strings.Shared_String := (Capacity => 103, Unused => 95, Length => 95, Value => (16#0041#, 16#0020#, 16#0070#, 16#0072#, 16#006F#, 16#0074#, 16#006F#, 16#0063#, 16#006F#, 16#006C#, 16#0020#, 16#0073#, 16#0074#, 16#0061#, 16#0074#, 16#0065#, 16#0020#, 16#006D#, 16#0061#, 16#0063#, 16#0068#, 16#0069#, 16#006E#, 16#0065#, 16#0020#, 16#006D#, 16#0075#, 16#0073#, 16#0074#, 16#0020#, 16#006F#, 16#006E#, 16#006C#, 16#0079#, 16#0020#, 16#0068#, 16#0061#, 16#0076#, 16#0065#, 16#0020#, 16#0061#, 16#0020#, 16#0063#, 16#006C#, 16#0061#, 16#0073#, 16#0073#, 16#0069#, 16#0066#, 16#0069#, 16#0065#, 16#0072#, 16#0020#, 16#0063#, 16#006F#, 16#006E#, 16#0074#, 16#0065#, 16#0078#, 16#0074#, 16#002C#, 16#0020#, 16#006E#, 16#006F#, 16#0074#, 16#0020#, 16#0061#, 16#0020#, 16#0062#, 16#0065#, 16#0068#, 16#0061#, 16#0076#, 16#0069#, 16#006F#, 16#0072#, 16#0061#, 16#006C#, 16#0020#, 16#0066#, 16#0065#, 16#0061#, 16#0074#, 16#0075#, 16#0072#, 16#0065#, 16#0020#, 16#0063#, 16#006F#, 16#006E#, 16#0074#, 16#0065#, 16#0078#, 16#0074#, 16#002E#, others => 16#0000#), others => <>); -- "A_receiveEvent_endMessage" MS_0293 : aliased Matreshka.Internals.Strings.Shared_String := (Capacity => 31, Unused => 25, Length => 25, Value => (16#0041#, 16#005F#, 16#0072#, 16#0065#, 16#0063#, 16#0065#, 16#0069#, 16#0076#, 16#0065#, 16#0045#, 16#0076#, 16#0065#, 16#006E#, 16#0074#, 16#005F#, 16#0065#, 16#006E#, 16#0064#, 16#004D#, 16#0065#, 16#0073#, 16#0073#, 16#0061#, 16#0067#, 16#0065#, others => 16#0000#), others => <>); -- "object_flow_edges" MS_0294 : aliased Matreshka.Internals.Strings.Shared_String := (Capacity => 23, Unused => 17, Length => 17, Value => (16#006F#, 16#0062#, 16#006A#, 16#0065#, 16#0063#, 16#0074#, 16#005F#, 16#0066#, 16#006C#, 16#006F#, 16#0077#, 16#005F#, 16#0065#, 16#0064#, 16#0067#, 16#0065#, 16#0073#, others => 16#0000#), others => <>); -- "A_returnValueRecipient_interactionUse" MS_0295 : aliased Matreshka.Internals.Strings.Shared_String := (Capacity => 39, Unused => 37, Length => 37, Value => (16#0041#, 16#005F#, 16#0072#, 16#0065#, 16#0074#, 16#0075#, 16#0072#, 16#006E#, 16#0056#, 16#0061#, 16#006C#, 16#0075#, 16#0065#, 16#0052#, 16#0065#, 16#0063#, 16#0069#, 16#0070#, 16#0069#, 16#0065#, 16#006E#, 16#0074#, 16#005F#, 16#0069#, 16#006E#, 16#0074#, 16#0065#, 16#0072#, 16#0061#, 16#0063#, 16#0074#, 16#0069#, 16#006F#, 16#006E#, 16#0055#, 16#0073#, 16#0065#, others => 16#0000#), others => <>); -- "References the Lifeline on which the StateInvariant appears." MS_0296 : aliased Matreshka.Internals.Strings.Shared_String := (Capacity => 63, Unused => 60, Length => 60, Value => (16#0052#, 16#0065#, 16#0066#, 16#0065#, 16#0072#, 16#0065#, 16#006E#, 16#0063#, 16#0065#, 16#0073#, 16#0020#, 16#0074#, 16#0068#, 16#0065#, 16#0020#, 16#004C#, 16#0069#, 16#0066#, 16#0065#, 16#006C#, 16#0069#, 16#006E#, 16#0065#, 16#0020#, 16#006F#, 16#006E#, 16#0020#, 16#0077#, 16#0068#, 16#0069#, 16#0063#, 16#0068#, 16#0020#, 16#0074#, 16#0068#, 16#0065#, 16#0020#, 16#0053#, 16#0074#, 16#0061#, 16#0074#, 16#0065#, 16#0049#, 16#006E#, 16#0076#, 16#0061#, 16#0072#, 16#0069#, 16#0061#, 16#006E#, 16#0074#, 16#0020#, 16#0061#, 16#0070#, 16#0070#, 16#0065#, 16#0061#, 16#0072#, 16#0073#, 16#002E#, others => 16#0000#), others => <>); -- "Interfaces may include receptions (in addition to operations)." MS_0297 : aliased Matreshka.Internals.Strings.Shared_String := (Capacity => 63, Unused => 62, Length => 62, Value => (16#0049#, 16#006E#, 16#0074#, 16#0065#, 16#0072#, 16#0066#, 16#0061#, 16#0063#, 16#0065#, 16#0073#, 16#0020#, 16#006D#, 16#0061#, 16#0079#, 16#0020#, 16#0069#, 16#006E#, 16#0063#, 16#006C#, 16#0075#, 16#0064#, 16#0065#, 16#0020#, 16#0072#, 16#0065#, 16#0063#, 16#0065#, 16#0070#, 16#0074#, 16#0069#, 16#006F#, 16#006E#, 16#0073#, 16#0020#, 16#0028#, 16#0069#, 16#006E#, 16#0020#, 16#0061#, 16#0064#, 16#0064#, 16#0069#, 16#0074#, 16#0069#, 16#006F#, 16#006E#, 16#0020#, 16#0074#, 16#006F#, 16#0020#, 16#006F#, 16#0070#, 16#0065#, 16#0072#, 16#0061#, 16#0074#, 16#0069#, 16#006F#, 16#006E#, 16#0073#, 16#0029#, 16#002E#, others => 16#0000#), others => <>); -- "allFeatures" MS_0298 : aliased Matreshka.Internals.Strings.Shared_String := (Capacity => 15, Unused => 11, Length => 11, Value => (16#0061#, 16#006C#, 16#006C#, 16#0046#, 16#0065#, 16#0061#, 16#0074#, 16#0075#, 16#0072#, 16#0065#, 16#0073#, others => 16#0000#), others => <>); -- "If true, the modeler asserts that at most one test will succeed." MS_0299 : aliased Matreshka.Internals.Strings.Shared_String := (Capacity => 71, Unused => 64, Length => 64, Value => (16#0049#, 16#0066#, 16#0020#, 16#0074#, 16#0072#, 16#0075#, 16#0065#, 16#002C#, 16#0020#, 16#0074#, 16#0068#, 16#0065#, 16#0020#, 16#006D#, 16#006F#, 16#0064#, 16#0065#, 16#006C#, 16#0065#, 16#0072#, 16#0020#, 16#0061#, 16#0073#, 16#0073#, 16#0065#, 16#0072#, 16#0074#, 16#0073#, 16#0020#, 16#0074#, 16#0068#, 16#0061#, 16#0074#, 16#0020#, 16#0061#, 16#0074#, 16#0020#, 16#006D#, 16#006F#, 16#0073#, 16#0074#, 16#0020#, 16#006F#, 16#006E#, 16#0065#, 16#0020#, 16#0074#, 16#0065#, 16#0073#, 16#0074#, 16#0020#, 16#0077#, 16#0069#, 16#006C#, 16#006C#, 16#0020#, 16#0073#, 16#0075#, 16#0063#, 16#0063#, 16#0065#, 16#0065#, 16#0064#, 16#002E#, others => 16#0000#), others => <>); -- "Holds the object on which to start the owned behavior." MS_029A : aliased Matreshka.Internals.Strings.Shared_String := (Capacity => 55, Unused => 54, Length => 54, Value => (16#0048#, 16#006F#, 16#006C#, 16#0064#, 16#0073#, 16#0020#, 16#0074#, 16#0068#, 16#0065#, 16#0020#, 16#006F#, 16#0062#, 16#006A#, 16#0065#, 16#0063#, 16#0074#, 16#0020#, 16#006F#, 16#006E#, 16#0020#, 16#0077#, 16#0068#, 16#0069#, 16#0063#, 16#0068#, 16#0020#, 16#0074#, 16#006F#, 16#0020#, 16#0073#, 16#0074#, 16#0061#, 16#0072#, 16#0074#, 16#0020#, 16#0074#, 16#0068#, 16#0065#, 16#0020#, 16#006F#, 16#0077#, 16#006E#, 16#0065#, 16#0064#, 16#0020#, 16#0062#, 16#0065#, 16#0068#, 16#0061#, 16#0076#, 16#0069#, 16#006F#, 16#0072#, 16#002E#, others => 16#0000#), others => <>); -- "If a non-literal ValueSpecification is used for the lower or upper bound, then evaluating that specification must not have side effects." MS_029B : aliased Matreshka.Internals.Strings.Shared_String := (Capacity => 143, Unused => 136, Length => 136, Value => (16#0049#, 16#0066#, 16#0020#, 16#0061#, 16#0020#, 16#006E#, 16#006F#, 16#006E#, 16#002D#, 16#006C#, 16#0069#, 16#0074#, 16#0065#, 16#0072#, 16#0061#, 16#006C#, 16#0020#, 16#0056#, 16#0061#, 16#006C#, 16#0075#, 16#0065#, 16#0053#, 16#0070#, 16#0065#, 16#0063#, 16#0069#, 16#0066#, 16#0069#, 16#0063#, 16#0061#, 16#0074#, 16#0069#, 16#006F#, 16#006E#, 16#0020#, 16#0069#, 16#0073#, 16#0020#, 16#0075#, 16#0073#, 16#0065#, 16#0064#, 16#0020#, 16#0066#, 16#006F#, 16#0072#, 16#0020#, 16#0074#, 16#0068#, 16#0065#, 16#0020#, 16#006C#, 16#006F#, 16#0077#, 16#0065#, 16#0072#, 16#0020#, 16#006F#, 16#0072#, 16#0020#, 16#0075#, 16#0070#, 16#0070#, 16#0065#, 16#0072#, 16#0020#, 16#0062#, 16#006F#, 16#0075#, 16#006E#, 16#0064#, 16#002C#, 16#0020#, 16#0074#, 16#0068#, 16#0065#, 16#006E#, 16#0020#, 16#0065#, 16#0076#, 16#0061#, 16#006C#, 16#0075#, 16#0061#, 16#0074#, 16#0069#, 16#006E#, 16#0067#, 16#0020#, 16#0074#, 16#0068#, 16#0061#, 16#0074#, 16#0020#, 16#0073#, 16#0070#, 16#0065#, 16#0063#, 16#0069#, 16#0066#, 16#0069#, 16#0063#, 16#0061#, 16#0074#, 16#0069#, 16#006F#, 16#006E#, 16#0020#, 16#006D#, 16#0075#, 16#0073#, 16#0074#, 16#0020#, 16#006E#, 16#006F#, 16#0074#, 16#0020#, 16#0068#, 16#0061#, 16#0076#, 16#0065#, 16#0020#, 16#0073#, 16#0069#, 16#0064#, 16#0065#, 16#0020#, 16#0065#, 16#0066#, 16#0066#, 16#0065#, 16#0063#, 16#0074#, 16#0073#, 16#002E#, others => 16#0000#), others => <>); -- "Continuations with the same name may only cover the same set of Lifelines (within one Classifier)." MS_029C : aliased Matreshka.Internals.Strings.Shared_String := (Capacity => 103, Unused => 98, Length => 98, Value => (16#0043#, 16#006F#, 16#006E#, 16#0074#, 16#0069#, 16#006E#, 16#0075#, 16#0061#, 16#0074#, 16#0069#, 16#006F#, 16#006E#, 16#0073#, 16#0020#, 16#0077#, 16#0069#, 16#0074#, 16#0068#, 16#0020#, 16#0074#, 16#0068#, 16#0065#, 16#0020#, 16#0073#, 16#0061#, 16#006D#, 16#0065#, 16#0020#, 16#006E#, 16#0061#, 16#006D#, 16#0065#, 16#0020#, 16#006D#, 16#0061#, 16#0079#, 16#0020#, 16#006F#, 16#006E#, 16#006C#, 16#0079#, 16#0020#, 16#0063#, 16#006F#, 16#0076#, 16#0065#, 16#0072#, 16#0020#, 16#0074#, 16#0068#, 16#0065#, 16#0020#, 16#0073#, 16#0061#, 16#006D#, 16#0065#, 16#0020#, 16#0073#, 16#0065#, 16#0074#, 16#0020#, 16#006F#, 16#0066#, 16#0020#, 16#004C#, 16#0069#, 16#0066#, 16#0065#, 16#006C#, 16#0069#, 16#006E#, 16#0065#, 16#0073#, 16#0020#, 16#0028#, 16#0077#, 16#0069#, 16#0074#, 16#0068#, 16#0069#, 16#006E#, 16#0020#, 16#006F#, 16#006E#, 16#0065#, 16#0020#, 16#0043#, 16#006C#, 16#0061#, 16#0073#, 16#0073#, 16#0069#, 16#0066#, 16#0069#, 16#0065#, 16#0072#, 16#0029#, 16#002E#, others => 16#0000#), others => <>); -- "behavior" MS_029D : aliased Matreshka.Internals.Strings.Shared_String := (Capacity => 15, Unused => 8, Length => 8, Value => (16#0062#, 16#0065#, 16#0068#, 16#0061#, 16#0076#, 16#0069#, 16#006F#, 16#0072#, others => 16#0000#), others => <>); -- "A set of classifiers to be removed from the classifiers of the object." MS_029E : aliased Matreshka.Internals.Strings.Shared_String := (Capacity => 79, Unused => 70, Length => 70, Value => (16#0041#, 16#0020#, 16#0073#, 16#0065#, 16#0074#, 16#0020#, 16#006F#, 16#0066#, 16#0020#, 16#0063#, 16#006C#, 16#0061#, 16#0073#, 16#0073#, 16#0069#, 16#0066#, 16#0069#, 16#0065#, 16#0072#, 16#0073#, 16#0020#, 16#0074#, 16#006F#, 16#0020#, 16#0062#, 16#0065#, 16#0020#, 16#0072#, 16#0065#, 16#006D#, 16#006F#, 16#0076#, 16#0065#, 16#0064#, 16#0020#, 16#0066#, 16#0072#, 16#006F#, 16#006D#, 16#0020#, 16#0074#, 16#0068#, 16#0065#, 16#0020#, 16#0063#, 16#006C#, 16#0061#, 16#0073#, 16#0073#, 16#0069#, 16#0066#, 16#0069#, 16#0065#, 16#0072#, 16#0073#, 16#0020#, 16#006F#, 16#0066#, 16#0020#, 16#0074#, 16#0068#, 16#0065#, 16#0020#, 16#006F#, 16#0062#, 16#006A#, 16#0065#, 16#0063#, 16#0074#, 16#002E#, others => 16#0000#), others => <>); -- "Specifies the targets of the DirectedRelationship." MS_029F : aliased Matreshka.Internals.Strings.Shared_String := (Capacity => 55, Unused => 50, Length => 50, Value => (16#0053#, 16#0070#, 16#0065#, 16#0063#, 16#0069#, 16#0066#, 16#0069#, 16#0065#, 16#0073#, 16#0020#, 16#0074#, 16#0068#, 16#0065#, 16#0020#, 16#0074#, 16#0061#, 16#0072#, 16#0067#, 16#0065#, 16#0074#, 16#0073#, 16#0020#, 16#006F#, 16#0066#, 16#0020#, 16#0074#, 16#0068#, 16#0065#, 16#0020#, 16#0044#, 16#0069#, 16#0072#, 16#0065#, 16#0063#, 16#0074#, 16#0065#, 16#0064#, 16#0052#, 16#0065#, 16#006C#, 16#0061#, 16#0074#, 16#0069#, 16#006F#, 16#006E#, 16#0073#, 16#0068#, 16#0069#, 16#0070#, 16#002E#, others => 16#0000#), others => <>); -- "A_classifier_templateParameter_parameteredElement" MS_02A0 : aliased Matreshka.Internals.Strings.Shared_String := (Capacity => 55, Unused => 49, Length => 49, Value => (16#0041#, 16#005F#, 16#0063#, 16#006C#, 16#0061#, 16#0073#, 16#0073#, 16#0069#, 16#0066#, 16#0069#, 16#0065#, 16#0072#, 16#005F#, 16#0074#, 16#0065#, 16#006D#, 16#0070#, 16#006C#, 16#0061#, 16#0074#, 16#0065#, 16#0050#, 16#0061#, 16#0072#, 16#0061#, 16#006D#, 16#0065#, 16#0074#, 16#0065#, 16#0072#, 16#005F#, 16#0070#, 16#0061#, 16#0072#, 16#0061#, 16#006D#, 16#0065#, 16#0074#, 16#0065#, 16#0072#, 16#0065#, 16#0064#, 16#0045#, 16#006C#, 16#0065#, 16#006D#, 16#0065#, 16#006E#, 16#0074#, others => 16#0000#), others => <>); -- "deploymentTarget" MS_02A1 : aliased Matreshka.Internals.Strings.Shared_String := (Capacity => 23, Unused => 16, Length => 16, Value => (16#0064#, 16#0065#, 16#0070#, 16#006C#, 16#006F#, 16#0079#, 16#006D#, 16#0065#, 16#006E#, 16#0074#, 16#0054#, 16#0061#, 16#0072#, 16#0067#, 16#0065#, 16#0074#, others => 16#0000#), others => <>); -- "RaiseExceptionAction" MS_02A2 : aliased Matreshka.Internals.Strings.Shared_String := (Capacity => 23, Unused => 20, Length => 20, Value => (16#0052#, 16#0061#, 16#0069#, 16#0073#, 16#0065#, 16#0045#, 16#0078#, 16#0063#, 16#0065#, 16#0070#, 16#0074#, 16#0069#, 16#006F#, 16#006E#, 16#0041#, 16#0063#, 16#0074#, 16#0069#, 16#006F#, 16#006E#, others => 16#0000#), others => <>); -- "The Action referenced by the ActionExecutionSpecification, if any, must be owned by the Interaction owning the ActionExecutionOccurrence." MS_02A3 : aliased Matreshka.Internals.Strings.Shared_String := (Capacity => 143, Unused => 137, Length => 137, Value => (16#0054#, 16#0068#, 16#0065#, 16#0020#, 16#0041#, 16#0063#, 16#0074#, 16#0069#, 16#006F#, 16#006E#, 16#0020#, 16#0072#, 16#0065#, 16#0066#, 16#0065#, 16#0072#, 16#0065#, 16#006E#, 16#0063#, 16#0065#, 16#0064#, 16#0020#, 16#0062#, 16#0079#, 16#0020#, 16#0074#, 16#0068#, 16#0065#, 16#0020#, 16#0041#, 16#0063#, 16#0074#, 16#0069#, 16#006F#, 16#006E#, 16#0045#, 16#0078#, 16#0065#, 16#0063#, 16#0075#, 16#0074#, 16#0069#, 16#006F#, 16#006E#, 16#0053#, 16#0070#, 16#0065#, 16#0063#, 16#0069#, 16#0066#, 16#0069#, 16#0063#, 16#0061#, 16#0074#, 16#0069#, 16#006F#, 16#006E#, 16#002C#, 16#0020#, 16#0069#, 16#0066#, 16#0020#, 16#0061#, 16#006E#, 16#0079#, 16#002C#, 16#0020#, 16#006D#, 16#0075#, 16#0073#, 16#0074#, 16#0020#, 16#0062#, 16#0065#, 16#0020#, 16#006F#, 16#0077#, 16#006E#, 16#0065#, 16#0064#, 16#0020#, 16#0062#, 16#0079#, 16#0020#, 16#0074#, 16#0068#, 16#0065#, 16#0020#, 16#0049#, 16#006E#, 16#0074#, 16#0065#, 16#0072#, 16#0061#, 16#0063#, 16#0074#, 16#0069#, 16#006F#, 16#006E#, 16#0020#, 16#006F#, 16#0077#, 16#006E#, 16#0069#, 16#006E#, 16#0067#, 16#0020#, 16#0074#, 16#0068#, 16#0065#, 16#0020#, 16#0041#, 16#0063#, 16#0074#, 16#0069#, 16#006F#, 16#006E#, 16#0045#, 16#0078#, 16#0065#, 16#0063#, 16#0075#, 16#0074#, 16#0069#, 16#006F#, 16#006E#, 16#004F#, 16#0063#, 16#0063#, 16#0075#, 16#0072#, 16#0072#, 16#0065#, 16#006E#, 16#0063#, 16#0065#, 16#002E#, others => 16#0000#), others => <>); -- "InputPin" MS_02A4 : aliased Matreshka.Internals.Strings.Shared_String := (Capacity => 15, Unused => 8, Length => 8, Value => (16#0049#, 16#006E#, 16#0070#, 16#0075#, 16#0074#, 16#0050#, 16#0069#, 16#006E#, others => 16#0000#), others => <>); -- "unmarshallType" MS_02A5 : aliased Matreshka.Internals.Strings.Shared_String := (Capacity => 15, Unused => 14, Length => 14, Value => (16#0075#, 16#006E#, 16#006D#, 16#0061#, 16#0072#, 16#0073#, 16#0068#, 16#0061#, 16#006C#, 16#006C#, 16#0054#, 16#0079#, 16#0070#, 16#0065#, others => 16#0000#), others => <>); -- "startObjectBehaviorAction" MS_02A6 : aliased Matreshka.Internals.Strings.Shared_String := (Capacity => 31, Unused => 25, Length => 25, Value => (16#0073#, 16#0074#, 16#0061#, 16#0072#, 16#0074#, 16#004F#, 16#0062#, 16#006A#, 16#0065#, 16#0063#, 16#0074#, 16#0042#, 16#0065#, 16#0068#, 16#0061#, 16#0076#, 16#0069#, 16#006F#, 16#0072#, 16#0041#, 16#0063#, 16#0074#, 16#0069#, 16#006F#, 16#006E#, others => 16#0000#), others => <>); -- "RedefinableElement" MS_02A7 : aliased Matreshka.Internals.Strings.Shared_String := (Capacity => 23, Unused => 18, Length => 18, Value => (16#0052#, 16#0065#, 16#0064#, 16#0065#, 16#0066#, 16#0069#, 16#006E#, 16#0061#, 16#0062#, 16#006C#, 16#0065#, 16#0045#, 16#006C#, 16#0065#, 16#006D#, 16#0065#, 16#006E#, 16#0074#, others => 16#0000#), others => <>); -- "The pin on which are put the objects participating in the association at the end not specified by the inputs." MS_02A8 : aliased Matreshka.Internals.Strings.Shared_String := (Capacity => 119, Unused => 109, Length => 109, Value => (16#0054#, 16#0068#, 16#0065#, 16#0020#, 16#0070#, 16#0069#, 16#006E#, 16#0020#, 16#006F#, 16#006E#, 16#0020#, 16#0077#, 16#0068#, 16#0069#, 16#0063#, 16#0068#, 16#0020#, 16#0061#, 16#0072#, 16#0065#, 16#0020#, 16#0070#, 16#0075#, 16#0074#, 16#0020#, 16#0074#, 16#0068#, 16#0065#, 16#0020#, 16#006F#, 16#0062#, 16#006A#, 16#0065#, 16#0063#, 16#0074#, 16#0073#, 16#0020#, 16#0070#, 16#0061#, 16#0072#, 16#0074#, 16#0069#, 16#0063#, 16#0069#, 16#0070#, 16#0061#, 16#0074#, 16#0069#, 16#006E#, 16#0067#, 16#0020#, 16#0069#, 16#006E#, 16#0020#, 16#0074#, 16#0068#, 16#0065#, 16#0020#, 16#0061#, 16#0073#, 16#0073#, 16#006F#, 16#0063#, 16#0069#, 16#0061#, 16#0074#, 16#0069#, 16#006F#, 16#006E#, 16#0020#, 16#0061#, 16#0074#, 16#0020#, 16#0074#, 16#0068#, 16#0065#, 16#0020#, 16#0065#, 16#006E#, 16#0064#, 16#0020#, 16#006E#, 16#006F#, 16#0074#, 16#0020#, 16#0073#, 16#0070#, 16#0065#, 16#0063#, 16#0069#, 16#0066#, 16#0069#, 16#0065#, 16#0064#, 16#0020#, 16#0062#, 16#0079#, 16#0020#, 16#0074#, 16#0068#, 16#0065#, 16#0020#, 16#0069#, 16#006E#, 16#0070#, 16#0075#, 16#0074#, 16#0073#, 16#002E#, others => 16#0000#), others => <>); -- "The query booleanValue() gives a single Boolean value when one can be computed." MS_02A9 : aliased Matreshka.Internals.Strings.Shared_String := (Capacity => 87, Unused => 79, Length => 79, Value => (16#0054#, 16#0068#, 16#0065#, 16#0020#, 16#0071#, 16#0075#, 16#0065#, 16#0072#, 16#0079#, 16#0020#, 16#0062#, 16#006F#, 16#006F#, 16#006C#, 16#0065#, 16#0061#, 16#006E#, 16#0056#, 16#0061#, 16#006C#, 16#0075#, 16#0065#, 16#0028#, 16#0029#, 16#0020#, 16#0067#, 16#0069#, 16#0076#, 16#0065#, 16#0073#, 16#0020#, 16#0061#, 16#0020#, 16#0073#, 16#0069#, 16#006E#, 16#0067#, 16#006C#, 16#0065#, 16#0020#, 16#0042#, 16#006F#, 16#006F#, 16#006C#, 16#0065#, 16#0061#, 16#006E#, 16#0020#, 16#0076#, 16#0061#, 16#006C#, 16#0075#, 16#0065#, 16#0020#, 16#0077#, 16#0068#, 16#0065#, 16#006E#, 16#0020#, 16#006F#, 16#006E#, 16#0065#, 16#0020#, 16#0063#, 16#0061#, 16#006E#, 16#0020#, 16#0062#, 16#0065#, 16#0020#, 16#0063#, 16#006F#, 16#006D#, 16#0070#, 16#0075#, 16#0074#, 16#0065#, 16#0064#, 16#002E#, others => 16#0000#), others => <>); -- "redefinedBehavior" MS_02AA : aliased Matreshka.Internals.Strings.Shared_String := (Capacity => 23, Unused => 17, Length => 17, Value => (16#0072#, 16#0065#, 16#0064#, 16#0065#, 16#0066#, 16#0069#, 16#006E#, 16#0065#, 16#0064#, 16#0042#, 16#0065#, 16#0068#, 16#0061#, 16#0076#, 16#0069#, 16#006F#, 16#0072#, others => 16#0000#), others => <>); -- "Designates the GeneralizationSet of which the associated Classifier is a power type." MS_02AB : aliased Matreshka.Internals.Strings.Shared_String := (Capacity => 87, Unused => 84, Length => 84, Value => (16#0044#, 16#0065#, 16#0073#, 16#0069#, 16#0067#, 16#006E#, 16#0061#, 16#0074#, 16#0065#, 16#0073#, 16#0020#, 16#0074#, 16#0068#, 16#0065#, 16#0020#, 16#0047#, 16#0065#, 16#006E#, 16#0065#, 16#0072#, 16#0061#, 16#006C#, 16#0069#, 16#007A#, 16#0061#, 16#0074#, 16#0069#, 16#006F#, 16#006E#, 16#0053#, 16#0065#, 16#0074#, 16#0020#, 16#006F#, 16#0066#, 16#0020#, 16#0077#, 16#0068#, 16#0069#, 16#0063#, 16#0068#, 16#0020#, 16#0074#, 16#0068#, 16#0065#, 16#0020#, 16#0061#, 16#0073#, 16#0073#, 16#006F#, 16#0063#, 16#0069#, 16#0061#, 16#0074#, 16#0065#, 16#0064#, 16#0020#, 16#0043#, 16#006C#, 16#0061#, 16#0073#, 16#0073#, 16#0069#, 16#0066#, 16#0069#, 16#0065#, 16#0072#, 16#0020#, 16#0069#, 16#0073#, 16#0020#, 16#0061#, 16#0020#, 16#0070#, 16#006F#, 16#0077#, 16#0065#, 16#0072#, 16#0020#, 16#0074#, 16#0079#, 16#0070#, 16#0065#, 16#002E#, others => 16#0000#), others => <>); -- "occurrence_specifications" MS_02AC : aliased Matreshka.Internals.Strings.Shared_String := (Capacity => 31, Unused => 25, Length => 25, Value => (16#006F#, 16#0063#, 16#0063#, 16#0075#, 16#0072#, 16#0072#, 16#0065#, 16#006E#, 16#0063#, 16#0065#, 16#005F#, 16#0073#, 16#0070#, 16#0065#, 16#0063#, 16#0069#, 16#0066#, 16#0069#, 16#0063#, 16#0061#, 16#0074#, 16#0069#, 16#006F#, 16#006E#, 16#0073#, others => 16#0000#), others => <>); -- "If true, the modeler asserts that at least one test will succeed." MS_02AD : aliased Matreshka.Internals.Strings.Shared_String := (Capacity => 71, Unused => 65, Length => 65, Value => (16#0049#, 16#0066#, 16#0020#, 16#0074#, 16#0072#, 16#0075#, 16#0065#, 16#002C#, 16#0020#, 16#0074#, 16#0068#, 16#0065#, 16#0020#, 16#006D#, 16#006F#, 16#0064#, 16#0065#, 16#006C#, 16#0065#, 16#0072#, 16#0020#, 16#0061#, 16#0073#, 16#0073#, 16#0065#, 16#0072#, 16#0074#, 16#0073#, 16#0020#, 16#0074#, 16#0068#, 16#0061#, 16#0074#, 16#0020#, 16#0061#, 16#0074#, 16#0020#, 16#006C#, 16#0065#, 16#0061#, 16#0073#, 16#0074#, 16#0020#, 16#006F#, 16#006E#, 16#0065#, 16#0020#, 16#0074#, 16#0065#, 16#0073#, 16#0074#, 16#0020#, 16#0077#, 16#0069#, 16#006C#, 16#006C#, 16#0020#, 16#0073#, 16#0075#, 16#0063#, 16#0063#, 16#0065#, 16#0065#, 16#0064#, 16#002E#, others => 16#0000#), others => <>); -- "A_outputValue_opaqueAction" MS_02AE : aliased Matreshka.Internals.Strings.Shared_String := (Capacity => 31, Unused => 26, Length => 26, Value => (16#0041#, 16#005F#, 16#006F#, 16#0075#, 16#0074#, 16#0070#, 16#0075#, 16#0074#, 16#0056#, 16#0061#, 16#006C#, 16#0075#, 16#0065#, 16#005F#, 16#006F#, 16#0070#, 16#0061#, 16#0071#, 16#0075#, 16#0065#, 16#0041#, 16#0063#, 16#0074#, 16#0069#, 16#006F#, 16#006E#, others => 16#0000#), others => <>); -- "isDisjoint" MS_02AF : aliased Matreshka.Internals.Strings.Shared_String := (Capacity => 15, Unused => 10, Length => 10, Value => (16#0069#, 16#0073#, 16#0044#, 16#0069#, 16#0073#, 16#006A#, 16#006F#, 16#0069#, 16#006E#, 16#0074#, others => 16#0000#), others => <>); -- "Refers to the TimeExpression denoting the minimum value of the range." MS_02B0 : aliased Matreshka.Internals.Strings.Shared_String := (Capacity => 71, Unused => 69, Length => 69, Value => (16#0052#, 16#0065#, 16#0066#, 16#0065#, 16#0072#, 16#0073#, 16#0020#, 16#0074#, 16#006F#, 16#0020#, 16#0074#, 16#0068#, 16#0065#, 16#0020#, 16#0054#, 16#0069#, 16#006D#, 16#0065#, 16#0045#, 16#0078#, 16#0070#, 16#0072#, 16#0065#, 16#0073#, 16#0073#, 16#0069#, 16#006F#, 16#006E#, 16#0020#, 16#0064#, 16#0065#, 16#006E#, 16#006F#, 16#0074#, 16#0069#, 16#006E#, 16#0067#, 16#0020#, 16#0074#, 16#0068#, 16#0065#, 16#0020#, 16#006D#, 16#0069#, 16#006E#, 16#0069#, 16#006D#, 16#0075#, 16#006D#, 16#0020#, 16#0076#, 16#0061#, 16#006C#, 16#0075#, 16#0065#, 16#0020#, 16#006F#, 16#0066#, 16#0020#, 16#0074#, 16#0068#, 16#0065#, 16#0020#, 16#0072#, 16#0061#, 16#006E#, 16#0067#, 16#0065#, 16#002E#, others => 16#0000#), others => <>); -- "An association describes a set of tuples whose values refer to typed instances. An instance of an association is called a link.A link is a tuple with one value for each end of the association, where each value is an instance of the type of the end." MS_02B1 : aliased Matreshka.Internals.Strings.Shared_String := (Capacity => 255, Unused => 248, Length => 248, Value => (16#0041#, 16#006E#, 16#0020#, 16#0061#, 16#0073#, 16#0073#, 16#006F#, 16#0063#, 16#0069#, 16#0061#, 16#0074#, 16#0069#, 16#006F#, 16#006E#, 16#0020#, 16#0064#, 16#0065#, 16#0073#, 16#0063#, 16#0072#, 16#0069#, 16#0062#, 16#0065#, 16#0073#, 16#0020#, 16#0061#, 16#0020#, 16#0073#, 16#0065#, 16#0074#, 16#0020#, 16#006F#, 16#0066#, 16#0020#, 16#0074#, 16#0075#, 16#0070#, 16#006C#, 16#0065#, 16#0073#, 16#0020#, 16#0077#, 16#0068#, 16#006F#, 16#0073#, 16#0065#, 16#0020#, 16#0076#, 16#0061#, 16#006C#, 16#0075#, 16#0065#, 16#0073#, 16#0020#, 16#0072#, 16#0065#, 16#0066#, 16#0065#, 16#0072#, 16#0020#, 16#0074#, 16#006F#, 16#0020#, 16#0074#, 16#0079#, 16#0070#, 16#0065#, 16#0064#, 16#0020#, 16#0069#, 16#006E#, 16#0073#, 16#0074#, 16#0061#, 16#006E#, 16#0063#, 16#0065#, 16#0073#, 16#002E#, 16#0020#, 16#0041#, 16#006E#, 16#0020#, 16#0069#, 16#006E#, 16#0073#, 16#0074#, 16#0061#, 16#006E#, 16#0063#, 16#0065#, 16#0020#, 16#006F#, 16#0066#, 16#0020#, 16#0061#, 16#006E#, 16#0020#, 16#0061#, 16#0073#, 16#0073#, 16#006F#, 16#0063#, 16#0069#, 16#0061#, 16#0074#, 16#0069#, 16#006F#, 16#006E#, 16#0020#, 16#0069#, 16#0073#, 16#0020#, 16#0063#, 16#0061#, 16#006C#, 16#006C#, 16#0065#, 16#0064#, 16#0020#, 16#0061#, 16#0020#, 16#006C#, 16#0069#, 16#006E#, 16#006B#, 16#002E#, 16#0041#, 16#0020#, 16#006C#, 16#0069#, 16#006E#, 16#006B#, 16#0020#, 16#0069#, 16#0073#, 16#0020#, 16#0061#, 16#0020#, 16#0074#, 16#0075#, 16#0070#, 16#006C#, 16#0065#, 16#0020#, 16#0077#, 16#0069#, 16#0074#, 16#0068#, 16#0020#, 16#006F#, 16#006E#, 16#0065#, 16#0020#, 16#0076#, 16#0061#, 16#006C#, 16#0075#, 16#0065#, 16#0020#, 16#0066#, 16#006F#, 16#0072#, 16#0020#, 16#0065#, 16#0061#, 16#0063#, 16#0068#, 16#0020#, 16#0065#, 16#006E#, 16#0064#, 16#0020#, 16#006F#, 16#0066#, 16#0020#, 16#0074#, 16#0068#, 16#0065#, 16#0020#, 16#0061#, 16#0073#, 16#0073#, 16#006F#, 16#0063#, 16#0069#, 16#0061#, 16#0074#, 16#0069#, 16#006F#, 16#006E#, 16#002C#, 16#0020#, 16#0077#, 16#0068#, 16#0065#, 16#0072#, 16#0065#, 16#0020#, 16#0065#, 16#0061#, 16#0063#, 16#0068#, 16#0020#, 16#0076#, 16#0061#, 16#006C#, 16#0075#, 16#0065#, 16#0020#, 16#0069#, 16#0073#, 16#0020#, 16#0061#, 16#006E#, 16#0020#, 16#0069#, 16#006E#, 16#0073#, 16#0074#, 16#0061#, 16#006E#, 16#0063#, 16#0065#, 16#0020#, 16#006F#, 16#0066#, 16#0020#, 16#0074#, 16#0068#, 16#0065#, 16#0020#, 16#0074#, 16#0079#, 16#0070#, 16#0065#, 16#0020#, 16#006F#, 16#0066#, 16#0020#, 16#0074#, 16#0068#, 16#0065#, 16#0020#, 16#0065#, 16#006E#, 16#0064#, 16#002E#, others => 16#0000#), others => <>); -- "A list of triggers that are candidates to be retained by the state machine if they trigger no transitions out of the state (not consumed). A deferred trigger is retained until the state machine reaches a state configuration where it is no longer deferred." MS_02B2 : aliased Matreshka.Internals.Strings.Shared_String := (Capacity => 263, Unused => 255, Length => 255, Value => (16#0041#, 16#0020#, 16#006C#, 16#0069#, 16#0073#, 16#0074#, 16#0020#, 16#006F#, 16#0066#, 16#0020#, 16#0074#, 16#0072#, 16#0069#, 16#0067#, 16#0067#, 16#0065#, 16#0072#, 16#0073#, 16#0020#, 16#0074#, 16#0068#, 16#0061#, 16#0074#, 16#0020#, 16#0061#, 16#0072#, 16#0065#, 16#0020#, 16#0063#, 16#0061#, 16#006E#, 16#0064#, 16#0069#, 16#0064#, 16#0061#, 16#0074#, 16#0065#, 16#0073#, 16#0020#, 16#0074#, 16#006F#, 16#0020#, 16#0062#, 16#0065#, 16#0020#, 16#0072#, 16#0065#, 16#0074#, 16#0061#, 16#0069#, 16#006E#, 16#0065#, 16#0064#, 16#0020#, 16#0062#, 16#0079#, 16#0020#, 16#0074#, 16#0068#, 16#0065#, 16#0020#, 16#0073#, 16#0074#, 16#0061#, 16#0074#, 16#0065#, 16#0020#, 16#006D#, 16#0061#, 16#0063#, 16#0068#, 16#0069#, 16#006E#, 16#0065#, 16#0020#, 16#0069#, 16#0066#, 16#0020#, 16#0074#, 16#0068#, 16#0065#, 16#0079#, 16#0020#, 16#0074#, 16#0072#, 16#0069#, 16#0067#, 16#0067#, 16#0065#, 16#0072#, 16#0020#, 16#006E#, 16#006F#, 16#0020#, 16#0074#, 16#0072#, 16#0061#, 16#006E#, 16#0073#, 16#0069#, 16#0074#, 16#0069#, 16#006F#, 16#006E#, 16#0073#, 16#0020#, 16#006F#, 16#0075#, 16#0074#, 16#0020#, 16#006F#, 16#0066#, 16#0020#, 16#0074#, 16#0068#, 16#0065#, 16#0020#, 16#0073#, 16#0074#, 16#0061#, 16#0074#, 16#0065#, 16#0020#, 16#0028#, 16#006E#, 16#006F#, 16#0074#, 16#0020#, 16#0063#, 16#006F#, 16#006E#, 16#0073#, 16#0075#, 16#006D#, 16#0065#, 16#0064#, 16#0029#, 16#002E#, 16#0020#, 16#0041#, 16#0020#, 16#0064#, 16#0065#, 16#0066#, 16#0065#, 16#0072#, 16#0072#, 16#0065#, 16#0064#, 16#0020#, 16#0074#, 16#0072#, 16#0069#, 16#0067#, 16#0067#, 16#0065#, 16#0072#, 16#0020#, 16#0069#, 16#0073#, 16#0020#, 16#0072#, 16#0065#, 16#0074#, 16#0061#, 16#0069#, 16#006E#, 16#0065#, 16#0064#, 16#0020#, 16#0075#, 16#006E#, 16#0074#, 16#0069#, 16#006C#, 16#0020#, 16#0074#, 16#0068#, 16#0065#, 16#0020#, 16#0073#, 16#0074#, 16#0061#, 16#0074#, 16#0065#, 16#0020#, 16#006D#, 16#0061#, 16#0063#, 16#0068#, 16#0069#, 16#006E#, 16#0065#, 16#0020#, 16#0072#, 16#0065#, 16#0061#, 16#0063#, 16#0068#, 16#0065#, 16#0073#, 16#0020#, 16#0061#, 16#0020#, 16#0073#, 16#0074#, 16#0061#, 16#0074#, 16#0065#, 16#0020#, 16#0063#, 16#006F#, 16#006E#, 16#0066#, 16#0069#, 16#0067#, 16#0075#, 16#0072#, 16#0061#, 16#0074#, 16#0069#, 16#006F#, 16#006E#, 16#0020#, 16#0077#, 16#0068#, 16#0065#, 16#0072#, 16#0065#, 16#0020#, 16#0069#, 16#0074#, 16#0020#, 16#0069#, 16#0073#, 16#0020#, 16#006E#, 16#006F#, 16#0020#, 16#006C#, 16#006F#, 16#006E#, 16#0067#, 16#0065#, 16#0072#, 16#0020#, 16#0064#, 16#0065#, 16#0066#, 16#0065#, 16#0072#, 16#0072#, 16#0065#, 16#0064#, 16#002E#, others => 16#0000#), others => <>); -- "inputElement" MS_02B3 : aliased Matreshka.Internals.Strings.Shared_String := (Capacity => 15, Unused => 12, Length => 12, Value => (16#0069#, 16#006E#, 16#0070#, 16#0075#, 16#0074#, 16#0045#, 16#006C#, 16#0065#, 16#006D#, 16#0065#, 16#006E#, 16#0074#, others => 16#0000#), others => <>); -- "Specifies whether the property is derived as the union of all of the properties that are constrained to subset it." MS_02B4 : aliased Matreshka.Internals.Strings.Shared_String := (Capacity => 119, Unused => 114, Length => 114, Value => (16#0053#, 16#0070#, 16#0065#, 16#0063#, 16#0069#, 16#0066#, 16#0069#, 16#0065#, 16#0073#, 16#0020#, 16#0077#, 16#0068#, 16#0065#, 16#0074#, 16#0068#, 16#0065#, 16#0072#, 16#0020#, 16#0074#, 16#0068#, 16#0065#, 16#0020#, 16#0070#, 16#0072#, 16#006F#, 16#0070#, 16#0065#, 16#0072#, 16#0074#, 16#0079#, 16#0020#, 16#0069#, 16#0073#, 16#0020#, 16#0064#, 16#0065#, 16#0072#, 16#0069#, 16#0076#, 16#0065#, 16#0064#, 16#0020#, 16#0061#, 16#0073#, 16#0020#, 16#0074#, 16#0068#, 16#0065#, 16#0020#, 16#0075#, 16#006E#, 16#0069#, 16#006F#, 16#006E#, 16#0020#, 16#006F#, 16#0066#, 16#0020#, 16#0061#, 16#006C#, 16#006C#, 16#0020#, 16#006F#, 16#0066#, 16#0020#, 16#0074#, 16#0068#, 16#0065#, 16#0020#, 16#0070#, 16#0072#, 16#006F#, 16#0070#, 16#0065#, 16#0072#, 16#0074#, 16#0069#, 16#0065#, 16#0073#, 16#0020#, 16#0074#, 16#0068#, 16#0061#, 16#0074#, 16#0020#, 16#0061#, 16#0072#, 16#0065#, 16#0020#, 16#0063#, 16#006F#, 16#006E#, 16#0073#, 16#0074#, 16#0072#, 16#0061#, 16#0069#, 16#006E#, 16#0065#, 16#0064#, 16#0020#, 16#0074#, 16#006F#, 16#0020#, 16#0073#, 16#0075#, 16#0062#, 16#0073#, 16#0065#, 16#0074#, 16#0020#, 16#0069#, 16#0074#, 16#002E#, others => 16#0000#), others => <>); -- "The multiplicity of the end object input pin must be 1..1." MS_02B5 : aliased Matreshka.Internals.Strings.Shared_String := (Capacity => 63, Unused => 58, Length => 58, Value => (16#0054#, 16#0068#, 16#0065#, 16#0020#, 16#006D#, 16#0075#, 16#006C#, 16#0074#, 16#0069#, 16#0070#, 16#006C#, 16#0069#, 16#0063#, 16#0069#, 16#0074#, 16#0079#, 16#0020#, 16#006F#, 16#0066#, 16#0020#, 16#0074#, 16#0068#, 16#0065#, 16#0020#, 16#0065#, 16#006E#, 16#0064#, 16#0020#, 16#006F#, 16#0062#, 16#006A#, 16#0065#, 16#0063#, 16#0074#, 16#0020#, 16#0069#, 16#006E#, 16#0070#, 16#0075#, 16#0074#, 16#0020#, 16#0070#, 16#0069#, 16#006E#, 16#0020#, 16#006D#, 16#0075#, 16#0073#, 16#0074#, 16#0020#, 16#0062#, 16#0065#, 16#0020#, 16#0031#, 16#002E#, 16#002E#, 16#0031#, 16#002E#, others => 16#0000#), others => <>); -- "References the use case which will include the addition and owns the include relationship." MS_02B6 : aliased Matreshka.Internals.Strings.Shared_String := (Capacity => 95, Unused => 90, Length => 90, Value => (16#0052#, 16#0065#, 16#0066#, 16#0065#, 16#0072#, 16#0065#, 16#006E#, 16#0063#, 16#0065#, 16#0073#, 16#0020#, 16#0074#, 16#0068#, 16#0065#, 16#0020#, 16#0075#, 16#0073#, 16#0065#, 16#0020#, 16#0063#, 16#0061#, 16#0073#, 16#0065#, 16#0020#, 16#0077#, 16#0068#, 16#0069#, 16#0063#, 16#0068#, 16#0020#, 16#0077#, 16#0069#, 16#006C#, 16#006C#, 16#0020#, 16#0069#, 16#006E#, 16#0063#, 16#006C#, 16#0075#, 16#0064#, 16#0065#, 16#0020#, 16#0074#, 16#0068#, 16#0065#, 16#0020#, 16#0061#, 16#0064#, 16#0064#, 16#0069#, 16#0074#, 16#0069#, 16#006F#, 16#006E#, 16#0020#, 16#0061#, 16#006E#, 16#0064#, 16#0020#, 16#006F#, 16#0077#, 16#006E#, 16#0073#, 16#0020#, 16#0074#, 16#0068#, 16#0065#, 16#0020#, 16#0069#, 16#006E#, 16#0063#, 16#006C#, 16#0075#, 16#0064#, 16#0065#, 16#0020#, 16#0072#, 16#0065#, 16#006C#, 16#0061#, 16#0074#, 16#0069#, 16#006F#, 16#006E#, 16#0073#, 16#0068#, 16#0069#, 16#0070#, 16#002E#, others => 16#0000#), others => <>); -- "A package merge defines how the contents of one package are extended by the contents of another package." MS_02B7 : aliased Matreshka.Internals.Strings.Shared_String := (Capacity => 111, Unused => 104, Length => 104, Value => (16#0041#, 16#0020#, 16#0070#, 16#0061#, 16#0063#, 16#006B#, 16#0061#, 16#0067#, 16#0065#, 16#0020#, 16#006D#, 16#0065#, 16#0072#, 16#0067#, 16#0065#, 16#0020#, 16#0064#, 16#0065#, 16#0066#, 16#0069#, 16#006E#, 16#0065#, 16#0073#, 16#0020#, 16#0068#, 16#006F#, 16#0077#, 16#0020#, 16#0074#, 16#0068#, 16#0065#, 16#0020#, 16#0063#, 16#006F#, 16#006E#, 16#0074#, 16#0065#, 16#006E#, 16#0074#, 16#0073#, 16#0020#, 16#006F#, 16#0066#, 16#0020#, 16#006F#, 16#006E#, 16#0065#, 16#0020#, 16#0070#, 16#0061#, 16#0063#, 16#006B#, 16#0061#, 16#0067#, 16#0065#, 16#0020#, 16#0061#, 16#0072#, 16#0065#, 16#0020#, 16#0065#, 16#0078#, 16#0074#, 16#0065#, 16#006E#, 16#0064#, 16#0065#, 16#0064#, 16#0020#, 16#0062#, 16#0079#, 16#0020#, 16#0074#, 16#0068#, 16#0065#, 16#0020#, 16#0063#, 16#006F#, 16#006E#, 16#0074#, 16#0065#, 16#006E#, 16#0074#, 16#0073#, 16#0020#, 16#006F#, 16#0066#, 16#0020#, 16#0061#, 16#006E#, 16#006F#, 16#0074#, 16#0068#, 16#0065#, 16#0072#, 16#0020#, 16#0070#, 16#0061#, 16#0063#, 16#006B#, 16#0061#, 16#0067#, 16#0065#, 16#002E#, others => 16#0000#), others => <>); -- "Node to which tokens are put when they traverse the edge." MS_02B8 : aliased Matreshka.Internals.Strings.Shared_String := (Capacity => 63, Unused => 57, Length => 57, Value => (16#004E#, 16#006F#, 16#0064#, 16#0065#, 16#0020#, 16#0074#, 16#006F#, 16#0020#, 16#0077#, 16#0068#, 16#0069#, 16#0063#, 16#0068#, 16#0020#, 16#0074#, 16#006F#, 16#006B#, 16#0065#, 16#006E#, 16#0073#, 16#0020#, 16#0061#, 16#0072#, 16#0065#, 16#0020#, 16#0070#, 16#0075#, 16#0074#, 16#0020#, 16#0077#, 16#0068#, 16#0065#, 16#006E#, 16#0020#, 16#0074#, 16#0068#, 16#0065#, 16#0079#, 16#0020#, 16#0074#, 16#0072#, 16#0061#, 16#0076#, 16#0065#, 16#0072#, 16#0073#, 16#0065#, 16#0020#, 16#0074#, 16#0068#, 16#0065#, 16#0020#, 16#0065#, 16#0064#, 16#0067#, 16#0065#, 16#002E#, others => 16#0000#), others => <>); -- "informationSource" MS_02B9 : aliased Matreshka.Internals.Strings.Shared_String := (Capacity => 23, Unused => 17, Length => 17, Value => (16#0069#, 16#006E#, 16#0066#, 16#006F#, 16#0072#, 16#006D#, 16#0061#, 16#0074#, 16#0069#, 16#006F#, 16#006E#, 16#0053#, 16#006F#, 16#0075#, 16#0072#, 16#0063#, 16#0065#, others => 16#0000#), others => <>); -- "covered" MS_02BA : aliased Matreshka.Internals.Strings.Shared_String := (Capacity => 15, Unused => 7, Length => 7, Value => (16#0063#, 16#006F#, 16#0076#, 16#0065#, 16#0072#, 16#0065#, 16#0064#, others => 16#0000#), others => <>); -- "The inheritedMember association is derived by inheriting the inheritable members of the parents." MS_02BB : aliased Matreshka.Internals.Strings.Shared_String := (Capacity => 103, Unused => 96, Length => 96, Value => (16#0054#, 16#0068#, 16#0065#, 16#0020#, 16#0069#, 16#006E#, 16#0068#, 16#0065#, 16#0072#, 16#0069#, 16#0074#, 16#0065#, 16#0064#, 16#004D#, 16#0065#, 16#006D#, 16#0062#, 16#0065#, 16#0072#, 16#0020#, 16#0061#, 16#0073#, 16#0073#, 16#006F#, 16#0063#, 16#0069#, 16#0061#, 16#0074#, 16#0069#, 16#006F#, 16#006E#, 16#0020#, 16#0069#, 16#0073#, 16#0020#, 16#0064#, 16#0065#, 16#0072#, 16#0069#, 16#0076#, 16#0065#, 16#0064#, 16#0020#, 16#0062#, 16#0079#, 16#0020#, 16#0069#, 16#006E#, 16#0068#, 16#0065#, 16#0072#, 16#0069#, 16#0074#, 16#0069#, 16#006E#, 16#0067#, 16#0020#, 16#0074#, 16#0068#, 16#0065#, 16#0020#, 16#0069#, 16#006E#, 16#0068#, 16#0065#, 16#0072#, 16#0069#, 16#0074#, 16#0061#, 16#0062#, 16#006C#, 16#0065#, 16#0020#, 16#006D#, 16#0065#, 16#006D#, 16#0062#, 16#0065#, 16#0072#, 16#0073#, 16#0020#, 16#006F#, 16#0066#, 16#0020#, 16#0074#, 16#0068#, 16#0065#, 16#0020#, 16#0070#, 16#0061#, 16#0072#, 16#0065#, 16#006E#, 16#0074#, 16#0073#, 16#002E#, others => 16#0000#), others => <>); -- "The Interface that owns this Operation." MS_02BC : aliased Matreshka.Internals.Strings.Shared_String := (Capacity => 47, Unused => 39, Length => 39, Value => (16#0054#, 16#0068#, 16#0065#, 16#0020#, 16#0049#, 16#006E#, 16#0074#, 16#0065#, 16#0072#, 16#0066#, 16#0061#, 16#0063#, 16#0065#, 16#0020#, 16#0074#, 16#0068#, 16#0061#, 16#0074#, 16#0020#, 16#006F#, 16#0077#, 16#006E#, 16#0073#, 16#0020#, 16#0074#, 16#0068#, 16#0069#, 16#0073#, 16#0020#, 16#004F#, 16#0070#, 16#0065#, 16#0072#, 16#0061#, 16#0074#, 16#0069#, 16#006F#, 16#006E#, 16#002E#, others => 16#0000#), others => <>); -- "A_changeExpression_changeEvent" MS_02BD : aliased Matreshka.Internals.Strings.Shared_String := (Capacity => 31, Unused => 30, Length => 30, Value => (16#0041#, 16#005F#, 16#0063#, 16#0068#, 16#0061#, 16#006E#, 16#0067#, 16#0065#, 16#0045#, 16#0078#, 16#0070#, 16#0072#, 16#0065#, 16#0073#, 16#0073#, 16#0069#, 16#006F#, 16#006E#, 16#005F#, 16#0063#, 16#0068#, 16#0061#, 16#006E#, 16#0067#, 16#0065#, 16#0045#, 16#0076#, 16#0065#, 16#006E#, 16#0074#, others => 16#0000#), others => <>); -- "The ordered set of fragments in the Interaction." MS_02BE : aliased Matreshka.Internals.Strings.Shared_String := (Capacity => 55, Unused => 48, Length => 48, Value => (16#0054#, 16#0068#, 16#0065#, 16#0020#, 16#006F#, 16#0072#, 16#0064#, 16#0065#, 16#0072#, 16#0065#, 16#0064#, 16#0020#, 16#0073#, 16#0065#, 16#0074#, 16#0020#, 16#006F#, 16#0066#, 16#0020#, 16#0066#, 16#0072#, 16#0061#, 16#0067#, 16#006D#, 16#0065#, 16#006E#, 16#0074#, 16#0073#, 16#0020#, 16#0069#, 16#006E#, 16#0020#, 16#0074#, 16#0068#, 16#0065#, 16#0020#, 16#0049#, 16#006E#, 16#0074#, 16#0065#, 16#0072#, 16#0061#, 16#0063#, 16#0074#, 16#0069#, 16#006F#, 16#006E#, 16#002E#, others => 16#0000#), others => <>); -- "References the Extensions that specify additional properties of the metaclass. The property is derived from the extensions whose memberEnds are typed by the Class." MS_02BF : aliased Matreshka.Internals.Strings.Shared_String := (Capacity => 175, Unused => 163, Length => 163, Value => (16#0052#, 16#0065#, 16#0066#, 16#0065#, 16#0072#, 16#0065#, 16#006E#, 16#0063#, 16#0065#, 16#0073#, 16#0020#, 16#0074#, 16#0068#, 16#0065#, 16#0020#, 16#0045#, 16#0078#, 16#0074#, 16#0065#, 16#006E#, 16#0073#, 16#0069#, 16#006F#, 16#006E#, 16#0073#, 16#0020#, 16#0074#, 16#0068#, 16#0061#, 16#0074#, 16#0020#, 16#0073#, 16#0070#, 16#0065#, 16#0063#, 16#0069#, 16#0066#, 16#0079#, 16#0020#, 16#0061#, 16#0064#, 16#0064#, 16#0069#, 16#0074#, 16#0069#, 16#006F#, 16#006E#, 16#0061#, 16#006C#, 16#0020#, 16#0070#, 16#0072#, 16#006F#, 16#0070#, 16#0065#, 16#0072#, 16#0074#, 16#0069#, 16#0065#, 16#0073#, 16#0020#, 16#006F#, 16#0066#, 16#0020#, 16#0074#, 16#0068#, 16#0065#, 16#0020#, 16#006D#, 16#0065#, 16#0074#, 16#0061#, 16#0063#, 16#006C#, 16#0061#, 16#0073#, 16#0073#, 16#002E#, 16#0020#, 16#0054#, 16#0068#, 16#0065#, 16#0020#, 16#0070#, 16#0072#, 16#006F#, 16#0070#, 16#0065#, 16#0072#, 16#0074#, 16#0079#, 16#0020#, 16#0069#, 16#0073#, 16#0020#, 16#0064#, 16#0065#, 16#0072#, 16#0069#, 16#0076#, 16#0065#, 16#0064#, 16#0020#, 16#0066#, 16#0072#, 16#006F#, 16#006D#, 16#0020#, 16#0074#, 16#0068#, 16#0065#, 16#0020#, 16#0065#, 16#0078#, 16#0074#, 16#0065#, 16#006E#, 16#0073#, 16#0069#, 16#006F#, 16#006E#, 16#0073#, 16#0020#, 16#0077#, 16#0068#, 16#006F#, 16#0073#, 16#0065#, 16#0020#, 16#006D#, 16#0065#, 16#006D#, 16#0062#, 16#0065#, 16#0072#, 16#0045#, 16#006E#, 16#0064#, 16#0073#, 16#0020#, 16#0061#, 16#0072#, 16#0065#, 16#0020#, 16#0074#, 16#0079#, 16#0070#, 16#0065#, 16#0064#, 16#0020#, 16#0062#, 16#0079#, 16#0020#, 16#0074#, 16#0068#, 16#0065#, 16#0020#, 16#0043#, 16#006C#, 16#0061#, 16#0073#, 16#0073#, 16#002E#, others => 16#0000#), others => <>); -- "A set of clauses whose tests must all evaluate false before the current clause can be tested." MS_02C0 : aliased Matreshka.Internals.Strings.Shared_String := (Capacity => 95, Unused => 93, Length => 93, Value => (16#0041#, 16#0020#, 16#0073#, 16#0065#, 16#0074#, 16#0020#, 16#006F#, 16#0066#, 16#0020#, 16#0063#, 16#006C#, 16#0061#, 16#0075#, 16#0073#, 16#0065#, 16#0073#, 16#0020#, 16#0077#, 16#0068#, 16#006F#, 16#0073#, 16#0065#, 16#0020#, 16#0074#, 16#0065#, 16#0073#, 16#0074#, 16#0073#, 16#0020#, 16#006D#, 16#0075#, 16#0073#, 16#0074#, 16#0020#, 16#0061#, 16#006C#, 16#006C#, 16#0020#, 16#0065#, 16#0076#, 16#0061#, 16#006C#, 16#0075#, 16#0061#, 16#0074#, 16#0065#, 16#0020#, 16#0066#, 16#0061#, 16#006C#, 16#0073#, 16#0065#, 16#0020#, 16#0062#, 16#0065#, 16#0066#, 16#006F#, 16#0072#, 16#0065#, 16#0020#, 16#0074#, 16#0068#, 16#0065#, 16#0020#, 16#0063#, 16#0075#, 16#0072#, 16#0072#, 16#0065#, 16#006E#, 16#0074#, 16#0020#, 16#0063#, 16#006C#, 16#0061#, 16#0075#, 16#0073#, 16#0065#, 16#0020#, 16#0063#, 16#0061#, 16#006E#, 16#0020#, 16#0062#, 16#0065#, 16#0020#, 16#0074#, 16#0065#, 16#0073#, 16#0074#, 16#0065#, 16#0064#, 16#002E#, others => 16#0000#), others => <>); -- "The type of the input pin must be the same as the type of at least one of the association ends of the association." MS_02C1 : aliased Matreshka.Internals.Strings.Shared_String := (Capacity => 119, Unused => 114, Length => 114, Value => (16#0054#, 16#0068#, 16#0065#, 16#0020#, 16#0074#, 16#0079#, 16#0070#, 16#0065#, 16#0020#, 16#006F#, 16#0066#, 16#0020#, 16#0074#, 16#0068#, 16#0065#, 16#0020#, 16#0069#, 16#006E#, 16#0070#, 16#0075#, 16#0074#, 16#0020#, 16#0070#, 16#0069#, 16#006E#, 16#0020#, 16#006D#, 16#0075#, 16#0073#, 16#0074#, 16#0020#, 16#0062#, 16#0065#, 16#0020#, 16#0074#, 16#0068#, 16#0065#, 16#0020#, 16#0073#, 16#0061#, 16#006D#, 16#0065#, 16#0020#, 16#0061#, 16#0073#, 16#0020#, 16#0074#, 16#0068#, 16#0065#, 16#0020#, 16#0074#, 16#0079#, 16#0070#, 16#0065#, 16#0020#, 16#006F#, 16#0066#, 16#0020#, 16#0061#, 16#0074#, 16#0020#, 16#006C#, 16#0065#, 16#0061#, 16#0073#, 16#0074#, 16#0020#, 16#006F#, 16#006E#, 16#0065#, 16#0020#, 16#006F#, 16#0066#, 16#0020#, 16#0074#, 16#0068#, 16#0065#, 16#0020#, 16#0061#, 16#0073#, 16#0073#, 16#006F#, 16#0063#, 16#0069#, 16#0061#, 16#0074#, 16#0069#, 16#006F#, 16#006E#, 16#0020#, 16#0065#, 16#006E#, 16#0064#, 16#0073#, 16#0020#, 16#006F#, 16#0066#, 16#0020#, 16#0074#, 16#0068#, 16#0065#, 16#0020#, 16#0061#, 16#0073#, 16#0073#, 16#006F#, 16#0063#, 16#0069#, 16#0061#, 16#0074#, 16#0069#, 16#006F#, 16#006E#, 16#002E#, others => 16#0000#), others => <>); -- "Since an interface specifies conformance characteristics, it does not own detailed behavior specifications. Instead, interfaces may own a protocol state machine that specifies event sequences and pre/post conditions for the operations and receptions described by the interface." MS_02C2 : aliased Matreshka.Internals.Strings.Shared_String := (Capacity => 287, Unused => 277, Length => 277, Value => (16#0053#, 16#0069#, 16#006E#, 16#0063#, 16#0065#, 16#0020#, 16#0061#, 16#006E#, 16#0020#, 16#0069#, 16#006E#, 16#0074#, 16#0065#, 16#0072#, 16#0066#, 16#0061#, 16#0063#, 16#0065#, 16#0020#, 16#0073#, 16#0070#, 16#0065#, 16#0063#, 16#0069#, 16#0066#, 16#0069#, 16#0065#, 16#0073#, 16#0020#, 16#0063#, 16#006F#, 16#006E#, 16#0066#, 16#006F#, 16#0072#, 16#006D#, 16#0061#, 16#006E#, 16#0063#, 16#0065#, 16#0020#, 16#0063#, 16#0068#, 16#0061#, 16#0072#, 16#0061#, 16#0063#, 16#0074#, 16#0065#, 16#0072#, 16#0069#, 16#0073#, 16#0074#, 16#0069#, 16#0063#, 16#0073#, 16#002C#, 16#0020#, 16#0069#, 16#0074#, 16#0020#, 16#0064#, 16#006F#, 16#0065#, 16#0073#, 16#0020#, 16#006E#, 16#006F#, 16#0074#, 16#0020#, 16#006F#, 16#0077#, 16#006E#, 16#0020#, 16#0064#, 16#0065#, 16#0074#, 16#0061#, 16#0069#, 16#006C#, 16#0065#, 16#0064#, 16#0020#, 16#0062#, 16#0065#, 16#0068#, 16#0061#, 16#0076#, 16#0069#, 16#006F#, 16#0072#, 16#0020#, 16#0073#, 16#0070#, 16#0065#, 16#0063#, 16#0069#, 16#0066#, 16#0069#, 16#0063#, 16#0061#, 16#0074#, 16#0069#, 16#006F#, 16#006E#, 16#0073#, 16#002E#, 16#0020#, 16#0049#, 16#006E#, 16#0073#, 16#0074#, 16#0065#, 16#0061#, 16#0064#, 16#002C#, 16#0020#, 16#0069#, 16#006E#, 16#0074#, 16#0065#, 16#0072#, 16#0066#, 16#0061#, 16#0063#, 16#0065#, 16#0073#, 16#0020#, 16#006D#, 16#0061#, 16#0079#, 16#0020#, 16#006F#, 16#0077#, 16#006E#, 16#0020#, 16#0061#, 16#0020#, 16#0070#, 16#0072#, 16#006F#, 16#0074#, 16#006F#, 16#0063#, 16#006F#, 16#006C#, 16#0020#, 16#0073#, 16#0074#, 16#0061#, 16#0074#, 16#0065#, 16#0020#, 16#006D#, 16#0061#, 16#0063#, 16#0068#, 16#0069#, 16#006E#, 16#0065#, 16#0020#, 16#0074#, 16#0068#, 16#0061#, 16#0074#, 16#0020#, 16#0073#, 16#0070#, 16#0065#, 16#0063#, 16#0069#, 16#0066#, 16#0069#, 16#0065#, 16#0073#, 16#0020#, 16#0065#, 16#0076#, 16#0065#, 16#006E#, 16#0074#, 16#0020#, 16#0073#, 16#0065#, 16#0071#, 16#0075#, 16#0065#, 16#006E#, 16#0063#, 16#0065#, 16#0073#, 16#0020#, 16#0061#, 16#006E#, 16#0064#, 16#0020#, 16#0070#, 16#0072#, 16#0065#, 16#002F#, 16#0070#, 16#006F#, 16#0073#, 16#0074#, 16#0020#, 16#0063#, 16#006F#, 16#006E#, 16#0064#, 16#0069#, 16#0074#, 16#0069#, 16#006F#, 16#006E#, 16#0073#, 16#0020#, 16#0066#, 16#006F#, 16#0072#, 16#0020#, 16#0074#, 16#0068#, 16#0065#, 16#0020#, 16#006F#, 16#0070#, 16#0065#, 16#0072#, 16#0061#, 16#0074#, 16#0069#, 16#006F#, 16#006E#, 16#0073#, 16#0020#, 16#0061#, 16#006E#, 16#0064#, 16#0020#, 16#0072#, 16#0065#, 16#0063#, 16#0065#, 16#0070#, 16#0074#, 16#0069#, 16#006F#, 16#006E#, 16#0073#, 16#0020#, 16#0064#, 16#0065#, 16#0073#, 16#0063#, 16#0072#, 16#0069#, 16#0062#, 16#0065#, 16#0064#, 16#0020#, 16#0062#, 16#0079#, 16#0020#, 16#0074#, 16#0068#, 16#0065#, 16#0020#, 16#0069#, 16#006E#, 16#0074#, 16#0065#, 16#0072#, 16#0066#, 16#0061#, 16#0063#, 16#0065#, 16#002E#, others => 16#0000#), others => <>); -- "A_generalOrdering_interactionFragment" MS_02C3 : aliased Matreshka.Internals.Strings.Shared_String := (Capacity => 39, Unused => 37, Length => 37, Value => (16#0041#, 16#005F#, 16#0067#, 16#0065#, 16#006E#, 16#0065#, 16#0072#, 16#0061#, 16#006C#, 16#004F#, 16#0072#, 16#0064#, 16#0065#, 16#0072#, 16#0069#, 16#006E#, 16#0067#, 16#005F#, 16#0069#, 16#006E#, 16#0074#, 16#0065#, 16#0072#, 16#0061#, 16#0063#, 16#0074#, 16#0069#, 16#006F#, 16#006E#, 16#0046#, 16#0072#, 16#0061#, 16#0067#, 16#006D#, 16#0065#, 16#006E#, 16#0074#, others => 16#0000#), others => <>); -- "A_result_readVariableAction" MS_02C4 : aliased Matreshka.Internals.Strings.Shared_String := (Capacity => 31, Unused => 27, Length => 27, Value => (16#0041#, 16#005F#, 16#0072#, 16#0065#, 16#0073#, 16#0075#, 16#006C#, 16#0074#, 16#005F#, 16#0072#, 16#0065#, 16#0061#, 16#0064#, 16#0056#, 16#0061#, 16#0072#, 16#0069#, 16#0061#, 16#0062#, 16#006C#, 16#0065#, 16#0041#, 16#0063#, 16#0074#, 16#0069#, 16#006F#, 16#006E#, others => 16#0000#), others => <>); -- "Package specializes TemplateableElement and PackageableElement specializes ParameterableElement to specify that a package can be used as a template and a PackageableElement as a template parameter." MS_02C5 : aliased Matreshka.Internals.Strings.Shared_String := (Capacity => 207, Unused => 197, Length => 197, Value => (16#0050#, 16#0061#, 16#0063#, 16#006B#, 16#0061#, 16#0067#, 16#0065#, 16#0020#, 16#0073#, 16#0070#, 16#0065#, 16#0063#, 16#0069#, 16#0061#, 16#006C#, 16#0069#, 16#007A#, 16#0065#, 16#0073#, 16#0020#, 16#0054#, 16#0065#, 16#006D#, 16#0070#, 16#006C#, 16#0061#, 16#0074#, 16#0065#, 16#0061#, 16#0062#, 16#006C#, 16#0065#, 16#0045#, 16#006C#, 16#0065#, 16#006D#, 16#0065#, 16#006E#, 16#0074#, 16#0020#, 16#0061#, 16#006E#, 16#0064#, 16#0020#, 16#0050#, 16#0061#, 16#0063#, 16#006B#, 16#0061#, 16#0067#, 16#0065#, 16#0061#, 16#0062#, 16#006C#, 16#0065#, 16#0045#, 16#006C#, 16#0065#, 16#006D#, 16#0065#, 16#006E#, 16#0074#, 16#0020#, 16#0073#, 16#0070#, 16#0065#, 16#0063#, 16#0069#, 16#0061#, 16#006C#, 16#0069#, 16#007A#, 16#0065#, 16#0073#, 16#0020#, 16#0050#, 16#0061#, 16#0072#, 16#0061#, 16#006D#, 16#0065#, 16#0074#, 16#0065#, 16#0072#, 16#0061#, 16#0062#, 16#006C#, 16#0065#, 16#0045#, 16#006C#, 16#0065#, 16#006D#, 16#0065#, 16#006E#, 16#0074#, 16#0020#, 16#0074#, 16#006F#, 16#0020#, 16#0073#, 16#0070#, 16#0065#, 16#0063#, 16#0069#, 16#0066#, 16#0079#, 16#0020#, 16#0074#, 16#0068#, 16#0061#, 16#0074#, 16#0020#, 16#0061#, 16#0020#, 16#0070#, 16#0061#, 16#0063#, 16#006B#, 16#0061#, 16#0067#, 16#0065#, 16#0020#, 16#0063#, 16#0061#, 16#006E#, 16#0020#, 16#0062#, 16#0065#, 16#0020#, 16#0075#, 16#0073#, 16#0065#, 16#0064#, 16#0020#, 16#0061#, 16#0073#, 16#0020#, 16#0061#, 16#0020#, 16#0074#, 16#0065#, 16#006D#, 16#0070#, 16#006C#, 16#0061#, 16#0074#, 16#0065#, 16#0020#, 16#0061#, 16#006E#, 16#0064#, 16#0020#, 16#0061#, 16#0020#, 16#0050#, 16#0061#, 16#0063#, 16#006B#, 16#0061#, 16#0067#, 16#0065#, 16#0061#, 16#0062#, 16#006C#, 16#0065#, 16#0045#, 16#006C#, 16#0065#, 16#006D#, 16#0065#, 16#006E#, 16#0074#, 16#0020#, 16#0061#, 16#0073#, 16#0020#, 16#0061#, 16#0020#, 16#0074#, 16#0065#, 16#006D#, 16#0070#, 16#006C#, 16#0061#, 16#0074#, 16#0065#, 16#0020#, 16#0070#, 16#0061#, 16#0072#, 16#0061#, 16#006D#, 16#0065#, 16#0074#, 16#0065#, 16#0072#, 16#002E#, others => 16#0000#), others => <>); -- "A structured activity node that owns the variable." MS_02C6 : aliased Matreshka.Internals.Strings.Shared_String := (Capacity => 55, Unused => 50, Length => 50, Value => (16#0041#, 16#0020#, 16#0073#, 16#0074#, 16#0072#, 16#0075#, 16#0063#, 16#0074#, 16#0075#, 16#0072#, 16#0065#, 16#0064#, 16#0020#, 16#0061#, 16#0063#, 16#0074#, 16#0069#, 16#0076#, 16#0069#, 16#0074#, 16#0079#, 16#0020#, 16#006E#, 16#006F#, 16#0064#, 16#0065#, 16#0020#, 16#0074#, 16#0068#, 16#0061#, 16#0074#, 16#0020#, 16#006F#, 16#0077#, 16#006E#, 16#0073#, 16#0020#, 16#0074#, 16#0068#, 16#0065#, 16#0020#, 16#0076#, 16#0061#, 16#0072#, 16#0069#, 16#0061#, 16#0062#, 16#006C#, 16#0065#, 16#002E#, others => 16#0000#), others => <>); -- "The query isNavigable() indicates whether it is possible to navigate across the property." MS_02C7 : aliased Matreshka.Internals.Strings.Shared_String := (Capacity => 95, Unused => 89, Length => 89, Value => (16#0054#, 16#0068#, 16#0065#, 16#0020#, 16#0071#, 16#0075#, 16#0065#, 16#0072#, 16#0079#, 16#0020#, 16#0069#, 16#0073#, 16#004E#, 16#0061#, 16#0076#, 16#0069#, 16#0067#, 16#0061#, 16#0062#, 16#006C#, 16#0065#, 16#0028#, 16#0029#, 16#0020#, 16#0069#, 16#006E#, 16#0064#, 16#0069#, 16#0063#, 16#0061#, 16#0074#, 16#0065#, 16#0073#, 16#0020#, 16#0077#, 16#0068#, 16#0065#, 16#0074#, 16#0068#, 16#0065#, 16#0072#, 16#0020#, 16#0069#, 16#0074#, 16#0020#, 16#0069#, 16#0073#, 16#0020#, 16#0070#, 16#006F#, 16#0073#, 16#0073#, 16#0069#, 16#0062#, 16#006C#, 16#0065#, 16#0020#, 16#0074#, 16#006F#, 16#0020#, 16#006E#, 16#0061#, 16#0076#, 16#0069#, 16#0067#, 16#0061#, 16#0074#, 16#0065#, 16#0020#, 16#0061#, 16#0063#, 16#0072#, 16#006F#, 16#0073#, 16#0073#, 16#0020#, 16#0074#, 16#0068#, 16#0065#, 16#0020#, 16#0070#, 16#0072#, 16#006F#, 16#0070#, 16#0065#, 16#0072#, 16#0074#, 16#0079#, 16#002E#, others => 16#0000#), others => <>); -- "An interaction operand is contained in a combined fragment. An interaction operand represents one operand of the expression given by the enclosing combined fragment." MS_02C8 : aliased Matreshka.Internals.Strings.Shared_String := (Capacity => 175, Unused => 165, Length => 165, Value => (16#0041#, 16#006E#, 16#0020#, 16#0069#, 16#006E#, 16#0074#, 16#0065#, 16#0072#, 16#0061#, 16#0063#, 16#0074#, 16#0069#, 16#006F#, 16#006E#, 16#0020#, 16#006F#, 16#0070#, 16#0065#, 16#0072#, 16#0061#, 16#006E#, 16#0064#, 16#0020#, 16#0069#, 16#0073#, 16#0020#, 16#0063#, 16#006F#, 16#006E#, 16#0074#, 16#0061#, 16#0069#, 16#006E#, 16#0065#, 16#0064#, 16#0020#, 16#0069#, 16#006E#, 16#0020#, 16#0061#, 16#0020#, 16#0063#, 16#006F#, 16#006D#, 16#0062#, 16#0069#, 16#006E#, 16#0065#, 16#0064#, 16#0020#, 16#0066#, 16#0072#, 16#0061#, 16#0067#, 16#006D#, 16#0065#, 16#006E#, 16#0074#, 16#002E#, 16#0020#, 16#0041#, 16#006E#, 16#0020#, 16#0069#, 16#006E#, 16#0074#, 16#0065#, 16#0072#, 16#0061#, 16#0063#, 16#0074#, 16#0069#, 16#006F#, 16#006E#, 16#0020#, 16#006F#, 16#0070#, 16#0065#, 16#0072#, 16#0061#, 16#006E#, 16#0064#, 16#0020#, 16#0072#, 16#0065#, 16#0070#, 16#0072#, 16#0065#, 16#0073#, 16#0065#, 16#006E#, 16#0074#, 16#0073#, 16#0020#, 16#006F#, 16#006E#, 16#0065#, 16#0020#, 16#006F#, 16#0070#, 16#0065#, 16#0072#, 16#0061#, 16#006E#, 16#0064#, 16#0020#, 16#006F#, 16#0066#, 16#0020#, 16#0074#, 16#0068#, 16#0065#, 16#0020#, 16#0065#, 16#0078#, 16#0070#, 16#0072#, 16#0065#, 16#0073#, 16#0073#, 16#0069#, 16#006F#, 16#006E#, 16#0020#, 16#0067#, 16#0069#, 16#0076#, 16#0065#, 16#006E#, 16#0020#, 16#0062#, 16#0079#, 16#0020#, 16#0074#, 16#0068#, 16#0065#, 16#0020#, 16#0065#, 16#006E#, 16#0063#, 16#006C#, 16#006F#, 16#0073#, 16#0069#, 16#006E#, 16#0067#, 16#0020#, 16#0063#, 16#006F#, 16#006D#, 16#0062#, 16#0069#, 16#006E#, 16#0065#, 16#0064#, 16#0020#, 16#0066#, 16#0072#, 16#0061#, 16#0067#, 16#006D#, 16#0065#, 16#006E#, 16#0074#, 16#002E#, others => 16#0000#), others => <>); -- "before" MS_02C9 : aliased Matreshka.Internals.Strings.Shared_String := (Capacity => 7, Unused => 6, Length => 6, Value => (16#0062#, 16#0065#, 16#0066#, 16#006F#, 16#0072#, 16#0065#, others => 16#0000#), others => <>); -- "The dynamic variables that take part in the constraint must be owned by the ConnectableElement corresponding to the covered Lifeline." MS_02CA : aliased Matreshka.Internals.Strings.Shared_String := (Capacity => 143, Unused => 133, Length => 133, Value => (16#0054#, 16#0068#, 16#0065#, 16#0020#, 16#0064#, 16#0079#, 16#006E#, 16#0061#, 16#006D#, 16#0069#, 16#0063#, 16#0020#, 16#0076#, 16#0061#, 16#0072#, 16#0069#, 16#0061#, 16#0062#, 16#006C#, 16#0065#, 16#0073#, 16#0020#, 16#0074#, 16#0068#, 16#0061#, 16#0074#, 16#0020#, 16#0074#, 16#0061#, 16#006B#, 16#0065#, 16#0020#, 16#0070#, 16#0061#, 16#0072#, 16#0074#, 16#0020#, 16#0069#, 16#006E#, 16#0020#, 16#0074#, 16#0068#, 16#0065#, 16#0020#, 16#0063#, 16#006F#, 16#006E#, 16#0073#, 16#0074#, 16#0072#, 16#0061#, 16#0069#, 16#006E#, 16#0074#, 16#0020#, 16#006D#, 16#0075#, 16#0073#, 16#0074#, 16#0020#, 16#0062#, 16#0065#, 16#0020#, 16#006F#, 16#0077#, 16#006E#, 16#0065#, 16#0064#, 16#0020#, 16#0062#, 16#0079#, 16#0020#, 16#0074#, 16#0068#, 16#0065#, 16#0020#, 16#0043#, 16#006F#, 16#006E#, 16#006E#, 16#0065#, 16#0063#, 16#0074#, 16#0061#, 16#0062#, 16#006C#, 16#0065#, 16#0045#, 16#006C#, 16#0065#, 16#006D#, 16#0065#, 16#006E#, 16#0074#, 16#0020#, 16#0063#, 16#006F#, 16#0072#, 16#0072#, 16#0065#, 16#0073#, 16#0070#, 16#006F#, 16#006E#, 16#0064#, 16#0069#, 16#006E#, 16#0067#, 16#0020#, 16#0074#, 16#006F#, 16#0020#, 16#0074#, 16#0068#, 16#0065#, 16#0020#, 16#0063#, 16#006F#, 16#0076#, 16#0065#, 16#0072#, 16#0065#, 16#0064#, 16#0020#, 16#004C#, 16#0069#, 16#0066#, 16#0065#, 16#006C#, 16#0069#, 16#006E#, 16#0065#, 16#002E#, others => 16#0000#), others => <>); -- "ownedReception" MS_02CB : aliased Matreshka.Internals.Strings.Shared_String := (Capacity => 15, Unused => 14, Length => 14, Value => (16#006F#, 16#0077#, 16#006E#, 16#0065#, 16#0064#, 16#0052#, 16#0065#, 16#0063#, 16#0065#, 16#0070#, 16#0074#, 16#0069#, 16#006F#, 16#006E#, others => 16#0000#), others => <>); -- "The multiplicity of the result output pin is 0..*." MS_02CC : aliased Matreshka.Internals.Strings.Shared_String := (Capacity => 55, Unused => 50, Length => 50, Value => (16#0054#, 16#0068#, 16#0065#, 16#0020#, 16#006D#, 16#0075#, 16#006C#, 16#0074#, 16#0069#, 16#0070#, 16#006C#, 16#0069#, 16#0063#, 16#0069#, 16#0074#, 16#0079#, 16#0020#, 16#006F#, 16#0066#, 16#0020#, 16#0074#, 16#0068#, 16#0065#, 16#0020#, 16#0072#, 16#0065#, 16#0073#, 16#0075#, 16#006C#, 16#0074#, 16#0020#, 16#006F#, 16#0075#, 16#0074#, 16#0070#, 16#0075#, 16#0074#, 16#0020#, 16#0070#, 16#0069#, 16#006E#, 16#0020#, 16#0069#, 16#0073#, 16#0020#, 16#0030#, 16#002E#, 16#002E#, 16#002A#, 16#002E#, others => 16#0000#), others => <>); -- "A_doActivity_state" MS_02CD : aliased Matreshka.Internals.Strings.Shared_String := (Capacity => 23, Unused => 18, Length => 18, Value => (16#0041#, 16#005F#, 16#0064#, 16#006F#, 16#0041#, 16#0063#, 16#0074#, 16#0069#, 16#0076#, 16#0069#, 16#0074#, 16#0079#, 16#005F#, 16#0073#, 16#0074#, 16#0061#, 16#0074#, 16#0065#, others => 16#0000#), others => <>); -- "A_context_action" MS_02CE : aliased Matreshka.Internals.Strings.Shared_String := (Capacity => 23, Unused => 16, Length => 16, Value => (16#0041#, 16#005F#, 16#0063#, 16#006F#, 16#006E#, 16#0074#, 16#0065#, 16#0078#, 16#0074#, 16#005F#, 16#0061#, 16#0063#, 16#0074#, 16#0069#, 16#006F#, 16#006E#, others => 16#0000#), others => <>); -- "The aggregation of an ExtensionEnd is composite." MS_02CF : aliased Matreshka.Internals.Strings.Shared_String := (Capacity => 55, Unused => 48, Length => 48, Value => (16#0054#, 16#0068#, 16#0065#, 16#0020#, 16#0061#, 16#0067#, 16#0067#, 16#0072#, 16#0065#, 16#0067#, 16#0061#, 16#0074#, 16#0069#, 16#006F#, 16#006E#, 16#0020#, 16#006F#, 16#0066#, 16#0020#, 16#0061#, 16#006E#, 16#0020#, 16#0045#, 16#0078#, 16#0074#, 16#0065#, 16#006E#, 16#0073#, 16#0069#, 16#006F#, 16#006E#, 16#0045#, 16#006E#, 16#0064#, 16#0020#, 16#0069#, 16#0073#, 16#0020#, 16#0063#, 16#006F#, 16#006D#, 16#0070#, 16#006F#, 16#0073#, 16#0069#, 16#0074#, 16#0065#, 16#002E#, others => 16#0000#), others => <>); -- "A_extendedSignature_redefinableTemplateSignature" MS_02D0 : aliased Matreshka.Internals.Strings.Shared_String := (Capacity => 55, Unused => 48, Length => 48, Value => (16#0041#, 16#005F#, 16#0065#, 16#0078#, 16#0074#, 16#0065#, 16#006E#, 16#0064#, 16#0065#, 16#0064#, 16#0053#, 16#0069#, 16#0067#, 16#006E#, 16#0061#, 16#0074#, 16#0075#, 16#0072#, 16#0065#, 16#005F#, 16#0072#, 16#0065#, 16#0064#, 16#0065#, 16#0066#, 16#0069#, 16#006E#, 16#0061#, 16#0062#, 16#006C#, 16#0065#, 16#0054#, 16#0065#, 16#006D#, 16#0070#, 16#006C#, 16#0061#, 16#0074#, 16#0065#, 16#0053#, 16#0069#, 16#0067#, 16#006E#, 16#0061#, 16#0074#, 16#0075#, 16#0072#, 16#0065#, others => 16#0000#), others => <>); -- "If a partition represents a part and is contained by another partition, then the part must be of a classifier represented by the containing partition, or of a classifier that is the type of a part representing the containing partition." MS_02D1 : aliased Matreshka.Internals.Strings.Shared_String := (Capacity => 247, Unused => 235, Length => 235, Value => (16#0049#, 16#0066#, 16#0020#, 16#0061#, 16#0020#, 16#0070#, 16#0061#, 16#0072#, 16#0074#, 16#0069#, 16#0074#, 16#0069#, 16#006F#, 16#006E#, 16#0020#, 16#0072#, 16#0065#, 16#0070#, 16#0072#, 16#0065#, 16#0073#, 16#0065#, 16#006E#, 16#0074#, 16#0073#, 16#0020#, 16#0061#, 16#0020#, 16#0070#, 16#0061#, 16#0072#, 16#0074#, 16#0020#, 16#0061#, 16#006E#, 16#0064#, 16#0020#, 16#0069#, 16#0073#, 16#0020#, 16#0063#, 16#006F#, 16#006E#, 16#0074#, 16#0061#, 16#0069#, 16#006E#, 16#0065#, 16#0064#, 16#0020#, 16#0062#, 16#0079#, 16#0020#, 16#0061#, 16#006E#, 16#006F#, 16#0074#, 16#0068#, 16#0065#, 16#0072#, 16#0020#, 16#0070#, 16#0061#, 16#0072#, 16#0074#, 16#0069#, 16#0074#, 16#0069#, 16#006F#, 16#006E#, 16#002C#, 16#0020#, 16#0074#, 16#0068#, 16#0065#, 16#006E#, 16#0020#, 16#0074#, 16#0068#, 16#0065#, 16#0020#, 16#0070#, 16#0061#, 16#0072#, 16#0074#, 16#0020#, 16#006D#, 16#0075#, 16#0073#, 16#0074#, 16#0020#, 16#0062#, 16#0065#, 16#0020#, 16#006F#, 16#0066#, 16#0020#, 16#0061#, 16#0020#, 16#0063#, 16#006C#, 16#0061#, 16#0073#, 16#0073#, 16#0069#, 16#0066#, 16#0069#, 16#0065#, 16#0072#, 16#0020#, 16#0072#, 16#0065#, 16#0070#, 16#0072#, 16#0065#, 16#0073#, 16#0065#, 16#006E#, 16#0074#, 16#0065#, 16#0064#, 16#0020#, 16#0062#, 16#0079#, 16#0020#, 16#0074#, 16#0068#, 16#0065#, 16#0020#, 16#0063#, 16#006F#, 16#006E#, 16#0074#, 16#0061#, 16#0069#, 16#006E#, 16#0069#, 16#006E#, 16#0067#, 16#0020#, 16#0070#, 16#0061#, 16#0072#, 16#0074#, 16#0069#, 16#0074#, 16#0069#, 16#006F#, 16#006E#, 16#002C#, 16#0020#, 16#006F#, 16#0072#, 16#0020#, 16#006F#, 16#0066#, 16#0020#, 16#0061#, 16#0020#, 16#0063#, 16#006C#, 16#0061#, 16#0073#, 16#0073#, 16#0069#, 16#0066#, 16#0069#, 16#0065#, 16#0072#, 16#0020#, 16#0074#, 16#0068#, 16#0061#, 16#0074#, 16#0020#, 16#0069#, 16#0073#, 16#0020#, 16#0074#, 16#0068#, 16#0065#, 16#0020#, 16#0074#, 16#0079#, 16#0070#, 16#0065#, 16#0020#, 16#006F#, 16#0066#, 16#0020#, 16#0061#, 16#0020#, 16#0070#, 16#0061#, 16#0072#, 16#0074#, 16#0020#, 16#0072#, 16#0065#, 16#0070#, 16#0072#, 16#0065#, 16#0073#, 16#0065#, 16#006E#, 16#0074#, 16#0069#, 16#006E#, 16#0067#, 16#0020#, 16#0074#, 16#0068#, 16#0065#, 16#0020#, 16#0063#, 16#006F#, 16#006E#, 16#0074#, 16#0061#, 16#0069#, 16#006E#, 16#0069#, 16#006E#, 16#0067#, 16#0020#, 16#0070#, 16#0061#, 16#0072#, 16#0074#, 16#0069#, 16#0074#, 16#0069#, 16#006F#, 16#006E#, 16#002E#, others => 16#0000#), others => <>); -- "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. In addition, for properties, the type must be conformant with the type of the specified parameterable element." MS_02D2 : aliased Matreshka.Internals.Strings.Shared_String := (Capacity => 391, Unused => 374, Length => 374, Value => (16#0054#, 16#0068#, 16#0065#, 16#0020#, 16#0071#, 16#0075#, 16#0065#, 16#0072#, 16#0079#, 16#0020#, 16#0069#, 16#0073#, 16#0043#, 16#006F#, 16#006D#, 16#0070#, 16#0061#, 16#0074#, 16#0069#, 16#0062#, 16#006C#, 16#0065#, 16#0057#, 16#0069#, 16#0074#, 16#0068#, 16#0028#, 16#0029#, 16#0020#, 16#0064#, 16#0065#, 16#0074#, 16#0065#, 16#0072#, 16#006D#, 16#0069#, 16#006E#, 16#0065#, 16#0073#, 16#0020#, 16#0069#, 16#0066#, 16#0020#, 16#0074#, 16#0068#, 16#0069#, 16#0073#, 16#0020#, 16#0070#, 16#0061#, 16#0072#, 16#0061#, 16#006D#, 16#0065#, 16#0074#, 16#0065#, 16#0072#, 16#0061#, 16#0062#, 16#006C#, 16#0065#, 16#0020#, 16#0065#, 16#006C#, 16#0065#, 16#006D#, 16#0065#, 16#006E#, 16#0074#, 16#0020#, 16#0069#, 16#0073#, 16#0020#, 16#0063#, 16#006F#, 16#006D#, 16#0070#, 16#0061#, 16#0074#, 16#0069#, 16#0062#, 16#006C#, 16#0065#, 16#0020#, 16#0077#, 16#0069#, 16#0074#, 16#0068#, 16#0020#, 16#0074#, 16#0068#, 16#0065#, 16#0020#, 16#0073#, 16#0070#, 16#0065#, 16#0063#, 16#0069#, 16#0066#, 16#0069#, 16#0065#, 16#0064#, 16#0020#, 16#0070#, 16#0061#, 16#0072#, 16#0061#, 16#006D#, 16#0065#, 16#0074#, 16#0065#, 16#0072#, 16#0061#, 16#0062#, 16#006C#, 16#0065#, 16#0020#, 16#0065#, 16#006C#, 16#0065#, 16#006D#, 16#0065#, 16#006E#, 16#0074#, 16#002E#, 16#0020#, 16#0042#, 16#0079#, 16#0020#, 16#0064#, 16#0065#, 16#0066#, 16#0061#, 16#0075#, 16#006C#, 16#0074#, 16#0020#, 16#0070#, 16#0061#, 16#0072#, 16#0061#, 16#006D#, 16#0065#, 16#0074#, 16#0065#, 16#0072#, 16#0061#, 16#0062#, 16#006C#, 16#0065#, 16#0020#, 16#0065#, 16#006C#, 16#0065#, 16#006D#, 16#0065#, 16#006E#, 16#0074#, 16#0020#, 16#0050#, 16#0020#, 16#0069#, 16#0073#, 16#0020#, 16#0063#, 16#006F#, 16#006D#, 16#0070#, 16#0061#, 16#0074#, 16#0069#, 16#0062#, 16#006C#, 16#0065#, 16#0020#, 16#0077#, 16#0069#, 16#0074#, 16#0068#, 16#0020#, 16#0070#, 16#0061#, 16#0072#, 16#0061#, 16#006D#, 16#0065#, 16#0074#, 16#0065#, 16#0072#, 16#0061#, 16#0062#, 16#006C#, 16#0065#, 16#0020#, 16#0065#, 16#006C#, 16#0065#, 16#006D#, 16#0065#, 16#006E#, 16#0074#, 16#0020#, 16#0051#, 16#0020#, 16#0069#, 16#0066#, 16#0020#, 16#0074#, 16#0068#, 16#0065#, 16#0020#, 16#006B#, 16#0069#, 16#006E#, 16#0064#, 16#0020#, 16#006F#, 16#0066#, 16#0020#, 16#0050#, 16#0020#, 16#0069#, 16#0073#, 16#0020#, 16#0074#, 16#0068#, 16#0065#, 16#0020#, 16#0073#, 16#0061#, 16#006D#, 16#0065#, 16#0020#, 16#006F#, 16#0072#, 16#0020#, 16#0061#, 16#0020#, 16#0073#, 16#0075#, 16#0062#, 16#0074#, 16#0079#, 16#0070#, 16#0065#, 16#0020#, 16#0061#, 16#0073#, 16#0020#, 16#0074#, 16#0068#, 16#0065#, 16#0020#, 16#006B#, 16#0069#, 16#006E#, 16#0064#, 16#0020#, 16#006F#, 16#0066#, 16#0020#, 16#0051#, 16#002E#, 16#0020#, 16#0049#, 16#006E#, 16#0020#, 16#0061#, 16#0064#, 16#0064#, 16#0069#, 16#0074#, 16#0069#, 16#006F#, 16#006E#, 16#002C#, 16#0020#, 16#0066#, 16#006F#, 16#0072#, 16#0020#, 16#0070#, 16#0072#, 16#006F#, 16#0070#, 16#0065#, 16#0072#, 16#0074#, 16#0069#, 16#0065#, 16#0073#, 16#002C#, 16#0020#, 16#0074#, 16#0068#, 16#0065#, 16#0020#, 16#0074#, 16#0079#, 16#0070#, 16#0065#, 16#0020#, 16#006D#, 16#0075#, 16#0073#, 16#0074#, 16#0020#, 16#0062#, 16#0065#, 16#0020#, 16#0063#, 16#006F#, 16#006E#, 16#0066#, 16#006F#, 16#0072#, 16#006D#, 16#0061#, 16#006E#, 16#0074#, 16#0020#, 16#0077#, 16#0069#, 16#0074#, 16#0068#, 16#0020#, 16#0074#, 16#0068#, 16#0065#, 16#0020#, 16#0074#, 16#0079#, 16#0070#, 16#0065#, 16#0020#, 16#006F#, 16#0066#, 16#0020#, 16#0074#, 16#0068#, 16#0065#, 16#0020#, 16#0073#, 16#0070#, 16#0065#, 16#0063#, 16#0069#, 16#0066#, 16#0069#, 16#0065#, 16#0064#, 16#0020#, 16#0070#, 16#0061#, 16#0072#, 16#0061#, 16#006D#, 16#0065#, 16#0074#, 16#0065#, 16#0072#, 16#0061#, 16#0062#, 16#006C#, 16#0065#, 16#0020#, 16#0065#, 16#006C#, 16#0065#, 16#006D#, 16#0065#, 16#006E#, 16#0074#, 16#002E#, others => 16#0000#), others => <>); -- "StructuredClassifier" MS_02D3 : aliased Matreshka.Internals.Strings.Shared_String := (Capacity => 23, Unused => 20, Length => 20, Value => (16#0053#, 16#0074#, 16#0072#, 16#0075#, 16#0063#, 16#0074#, 16#0075#, 16#0072#, 16#0065#, 16#0064#, 16#0043#, 16#006C#, 16#0061#, 16#0073#, 16#0073#, 16#0069#, 16#0066#, 16#0069#, 16#0065#, 16#0072#, others => 16#0000#), others => <>); -- "The number and order of result pins must be the same as the number and order of the in-out, out and return parameters of the invoked behavior. Pins are matched to parameters by order." MS_02D4 : aliased Matreshka.Internals.Strings.Shared_String := (Capacity => 191, Unused => 183, Length => 183, Value => (16#0054#, 16#0068#, 16#0065#, 16#0020#, 16#006E#, 16#0075#, 16#006D#, 16#0062#, 16#0065#, 16#0072#, 16#0020#, 16#0061#, 16#006E#, 16#0064#, 16#0020#, 16#006F#, 16#0072#, 16#0064#, 16#0065#, 16#0072#, 16#0020#, 16#006F#, 16#0066#, 16#0020#, 16#0072#, 16#0065#, 16#0073#, 16#0075#, 16#006C#, 16#0074#, 16#0020#, 16#0070#, 16#0069#, 16#006E#, 16#0073#, 16#0020#, 16#006D#, 16#0075#, 16#0073#, 16#0074#, 16#0020#, 16#0062#, 16#0065#, 16#0020#, 16#0074#, 16#0068#, 16#0065#, 16#0020#, 16#0073#, 16#0061#, 16#006D#, 16#0065#, 16#0020#, 16#0061#, 16#0073#, 16#0020#, 16#0074#, 16#0068#, 16#0065#, 16#0020#, 16#006E#, 16#0075#, 16#006D#, 16#0062#, 16#0065#, 16#0072#, 16#0020#, 16#0061#, 16#006E#, 16#0064#, 16#0020#, 16#006F#, 16#0072#, 16#0064#, 16#0065#, 16#0072#, 16#0020#, 16#006F#, 16#0066#, 16#0020#, 16#0074#, 16#0068#, 16#0065#, 16#0020#, 16#0069#, 16#006E#, 16#002D#, 16#006F#, 16#0075#, 16#0074#, 16#002C#, 16#0020#, 16#006F#, 16#0075#, 16#0074#, 16#0020#, 16#0061#, 16#006E#, 16#0064#, 16#0020#, 16#0072#, 16#0065#, 16#0074#, 16#0075#, 16#0072#, 16#006E#, 16#0020#, 16#0070#, 16#0061#, 16#0072#, 16#0061#, 16#006D#, 16#0065#, 16#0074#, 16#0065#, 16#0072#, 16#0073#, 16#0020#, 16#006F#, 16#0066#, 16#0020#, 16#0074#, 16#0068#, 16#0065#, 16#0020#, 16#0069#, 16#006E#, 16#0076#, 16#006F#, 16#006B#, 16#0065#, 16#0064#, 16#0020#, 16#0062#, 16#0065#, 16#0068#, 16#0061#, 16#0076#, 16#0069#, 16#006F#, 16#0072#, 16#002E#, 16#0020#, 16#0050#, 16#0069#, 16#006E#, 16#0073#, 16#0020#, 16#0061#, 16#0072#, 16#0065#, 16#0020#, 16#006D#, 16#0061#, 16#0074#, 16#0063#, 16#0068#, 16#0065#, 16#0064#, 16#0020#, 16#0074#, 16#006F#, 16#0020#, 16#0070#, 16#0061#, 16#0072#, 16#0061#, 16#006D#, 16#0065#, 16#0074#, 16#0065#, 16#0072#, 16#0073#, 16#0020#, 16#0062#, 16#0079#, 16#0020#, 16#006F#, 16#0072#, 16#0064#, 16#0065#, 16#0072#, 16#002E#, others => 16#0000#), others => <>); -- "A_informationSource_informationFlow" MS_02D5 : aliased Matreshka.Internals.Strings.Shared_String := (Capacity => 39, Unused => 35, Length => 35, Value => (16#0041#, 16#005F#, 16#0069#, 16#006E#, 16#0066#, 16#006F#, 16#0072#, 16#006D#, 16#0061#, 16#0074#, 16#0069#, 16#006F#, 16#006E#, 16#0053#, 16#006F#, 16#0075#, 16#0072#, 16#0063#, 16#0065#, 16#005F#, 16#0069#, 16#006E#, 16#0066#, 16#006F#, 16#0072#, 16#006D#, 16#0061#, 16#0074#, 16#0069#, 16#006F#, 16#006E#, 16#0046#, 16#006C#, 16#006F#, 16#0077#, others => 16#0000#), others => <>); -- "The set of Deployments for a DeploymentTarget." MS_02D6 : aliased Matreshka.Internals.Strings.Shared_String := (Capacity => 47, Unused => 46, Length => 46, Value => (16#0054#, 16#0068#, 16#0065#, 16#0020#, 16#0073#, 16#0065#, 16#0074#, 16#0020#, 16#006F#, 16#0066#, 16#0020#, 16#0044#, 16#0065#, 16#0070#, 16#006C#, 16#006F#, 16#0079#, 16#006D#, 16#0065#, 16#006E#, 16#0074#, 16#0073#, 16#0020#, 16#0066#, 16#006F#, 16#0072#, 16#0020#, 16#0061#, 16#0020#, 16#0044#, 16#0065#, 16#0070#, 16#006C#, 16#006F#, 16#0079#, 16#006D#, 16#0065#, 16#006E#, 16#0074#, 16#0054#, 16#0061#, 16#0072#, 16#0067#, 16#0065#, 16#0074#, 16#002E#, others => 16#0000#), others => <>); -- "region_as_input_or_output" MS_02D7 : aliased Matreshka.Internals.Strings.Shared_String := (Capacity => 31, Unused => 25, Length => 25, Value => (16#0072#, 16#0065#, 16#0067#, 16#0069#, 16#006F#, 16#006E#, 16#005F#, 16#0061#, 16#0073#, 16#005F#, 16#0069#, 16#006E#, 16#0070#, 16#0075#, 16#0074#, 16#005F#, 16#006F#, 16#0072#, 16#005F#, 16#006F#, 16#0075#, 16#0074#, 16#0070#, 16#0075#, 16#0074#, others => 16#0000#), others => <>); -- "If the input pin has a type, then the type must have a classifier behavior." MS_02D8 : aliased Matreshka.Internals.Strings.Shared_String := (Capacity => 79, Unused => 75, Length => 75, Value => (16#0049#, 16#0066#, 16#0020#, 16#0074#, 16#0068#, 16#0065#, 16#0020#, 16#0069#, 16#006E#, 16#0070#, 16#0075#, 16#0074#, 16#0020#, 16#0070#, 16#0069#, 16#006E#, 16#0020#, 16#0068#, 16#0061#, 16#0073#, 16#0020#, 16#0061#, 16#0020#, 16#0074#, 16#0079#, 16#0070#, 16#0065#, 16#002C#, 16#0020#, 16#0074#, 16#0068#, 16#0065#, 16#006E#, 16#0020#, 16#0074#, 16#0068#, 16#0065#, 16#0020#, 16#0074#, 16#0079#, 16#0070#, 16#0065#, 16#0020#, 16#006D#, 16#0075#, 16#0073#, 16#0074#, 16#0020#, 16#0068#, 16#0061#, 16#0076#, 16#0065#, 16#0020#, 16#0061#, 16#0020#, 16#0063#, 16#006C#, 16#0061#, 16#0073#, 16#0073#, 16#0069#, 16#0066#, 16#0069#, 16#0065#, 16#0072#, 16#0020#, 16#0062#, 16#0065#, 16#0068#, 16#0061#, 16#0076#, 16#0069#, 16#006F#, 16#0072#, 16#002E#, others => 16#0000#), others => <>); -- "AddStructuralFeatureValueAction" MS_02D9 : aliased Matreshka.Internals.Strings.Shared_String := (Capacity => 39, Unused => 31, Length => 31, Value => (16#0041#, 16#0064#, 16#0064#, 16#0053#, 16#0074#, 16#0072#, 16#0075#, 16#0063#, 16#0074#, 16#0075#, 16#0072#, 16#0061#, 16#006C#, 16#0046#, 16#0065#, 16#0061#, 16#0074#, 16#0075#, 16#0072#, 16#0065#, 16#0056#, 16#0061#, 16#006C#, 16#0075#, 16#0065#, 16#0041#, 16#0063#, 16#0074#, 16#0069#, 16#006F#, 16#006E#, others => 16#0000#), others => <>); -- "A_deployedArtifact_deployment" MS_02DA : aliased Matreshka.Internals.Strings.Shared_String := (Capacity => 31, Unused => 29, Length => 29, Value => (16#0041#, 16#005F#, 16#0064#, 16#0065#, 16#0070#, 16#006C#, 16#006F#, 16#0079#, 16#0065#, 16#0064#, 16#0041#, 16#0072#, 16#0074#, 16#0069#, 16#0066#, 16#0061#, 16#0063#, 16#0074#, 16#005F#, 16#0064#, 16#0065#, 16#0070#, 16#006C#, 16#006F#, 16#0079#, 16#006D#, 16#0065#, 16#006E#, 16#0074#, others => 16#0000#), others => <>); -- "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." MS_02DB : aliased Matreshka.Internals.Strings.Shared_String := (Capacity => 367, Unused => 353, Length => 353, Value => (16#0054#, 16#0068#, 16#0065#, 16#0020#, 16#0071#, 16#0075#, 16#0065#, 16#0072#, 16#0079#, 16#0020#, 16#0069#, 16#0073#, 16#0043#, 16#006F#, 16#006D#, 16#0070#, 16#0061#, 16#0074#, 16#0069#, 16#0062#, 16#006C#, 16#0065#, 16#0057#, 16#0069#, 16#0074#, 16#0068#, 16#0028#, 16#0029#, 16#0020#, 16#0064#, 16#0065#, 16#0074#, 16#0065#, 16#0072#, 16#006D#, 16#0069#, 16#006E#, 16#0065#, 16#0073#, 16#0020#, 16#0069#, 16#0066#, 16#0020#, 16#0074#, 16#0068#, 16#0069#, 16#0073#, 16#0020#, 16#0070#, 16#0061#, 16#0072#, 16#0061#, 16#006D#, 16#0065#, 16#0074#, 16#0065#, 16#0072#, 16#0061#, 16#0062#, 16#006C#, 16#0065#, 16#0020#, 16#0065#, 16#006C#, 16#0065#, 16#006D#, 16#0065#, 16#006E#, 16#0074#, 16#0020#, 16#0069#, 16#0073#, 16#0020#, 16#0063#, 16#006F#, 16#006D#, 16#0070#, 16#0061#, 16#0074#, 16#0069#, 16#0062#, 16#006C#, 16#0065#, 16#0020#, 16#0077#, 16#0069#, 16#0074#, 16#0068#, 16#0020#, 16#0074#, 16#0068#, 16#0065#, 16#0020#, 16#0073#, 16#0070#, 16#0065#, 16#0063#, 16#0069#, 16#0066#, 16#0069#, 16#0065#, 16#0064#, 16#0020#, 16#0070#, 16#0061#, 16#0072#, 16#0061#, 16#006D#, 16#0065#, 16#0074#, 16#0065#, 16#0072#, 16#0061#, 16#0062#, 16#006C#, 16#0065#, 16#0020#, 16#0065#, 16#006C#, 16#0065#, 16#006D#, 16#0065#, 16#006E#, 16#0074#, 16#002E#, 16#0020#, 16#0042#, 16#0079#, 16#0020#, 16#0064#, 16#0065#, 16#0066#, 16#0061#, 16#0075#, 16#006C#, 16#0074#, 16#0020#, 16#0070#, 16#0061#, 16#0072#, 16#0061#, 16#006D#, 16#0065#, 16#0074#, 16#0065#, 16#0072#, 16#0061#, 16#0062#, 16#006C#, 16#0065#, 16#0020#, 16#0065#, 16#006C#, 16#0065#, 16#006D#, 16#0065#, 16#006E#, 16#0074#, 16#0020#, 16#0050#, 16#0020#, 16#0069#, 16#0073#, 16#0020#, 16#0063#, 16#006F#, 16#006D#, 16#0070#, 16#0061#, 16#0074#, 16#0069#, 16#0062#, 16#006C#, 16#0065#, 16#0020#, 16#0077#, 16#0069#, 16#0074#, 16#0068#, 16#0020#, 16#0070#, 16#0061#, 16#0072#, 16#0061#, 16#006D#, 16#0065#, 16#0074#, 16#0065#, 16#0072#, 16#0061#, 16#0062#, 16#006C#, 16#0065#, 16#0020#, 16#0065#, 16#006C#, 16#0065#, 16#006D#, 16#0065#, 16#006E#, 16#0074#, 16#0020#, 16#0051#, 16#0020#, 16#0069#, 16#0066#, 16#0020#, 16#0074#, 16#0068#, 16#0065#, 16#0020#, 16#006B#, 16#0069#, 16#006E#, 16#0064#, 16#0020#, 16#006F#, 16#0066#, 16#0020#, 16#0050#, 16#0020#, 16#0069#, 16#0073#, 16#0020#, 16#0074#, 16#0068#, 16#0065#, 16#0020#, 16#0073#, 16#0061#, 16#006D#, 16#0065#, 16#0020#, 16#006F#, 16#0072#, 16#0020#, 16#0061#, 16#0020#, 16#0073#, 16#0075#, 16#0062#, 16#0074#, 16#0079#, 16#0070#, 16#0065#, 16#0020#, 16#0061#, 16#0073#, 16#0020#, 16#0074#, 16#0068#, 16#0065#, 16#0020#, 16#006B#, 16#0069#, 16#006E#, 16#0064#, 16#0020#, 16#006F#, 16#0066#, 16#0020#, 16#0051#, 16#002E#, 16#0020#, 16#0053#, 16#0075#, 16#0062#, 16#0063#, 16#006C#, 16#0061#, 16#0073#, 16#0073#, 16#0065#, 16#0073#, 16#0020#, 16#0073#, 16#0068#, 16#006F#, 16#0075#, 16#006C#, 16#0064#, 16#0020#, 16#006F#, 16#0076#, 16#0065#, 16#0072#, 16#0072#, 16#0069#, 16#0064#, 16#0065#, 16#0020#, 16#0074#, 16#0068#, 16#0069#, 16#0073#, 16#0020#, 16#006F#, 16#0070#, 16#0065#, 16#0072#, 16#0061#, 16#0074#, 16#0069#, 16#006F#, 16#006E#, 16#0020#, 16#0074#, 16#006F#, 16#0020#, 16#0073#, 16#0070#, 16#0065#, 16#0063#, 16#0069#, 16#0066#, 16#0079#, 16#0020#, 16#0064#, 16#0069#, 16#0066#, 16#0066#, 16#0065#, 16#0072#, 16#0065#, 16#006E#, 16#0074#, 16#0020#, 16#0063#, 16#006F#, 16#006D#, 16#0070#, 16#0061#, 16#0074#, 16#0069#, 16#0062#, 16#0069#, 16#006C#, 16#0069#, 16#0074#, 16#0079#, 16#0020#, 16#0063#, 16#006F#, 16#006E#, 16#0073#, 16#0074#, 16#0072#, 16#0061#, 16#0069#, 16#006E#, 16#0074#, 16#0073#, 16#002E#, others => 16#0000#), others => <>); -- "upper_ge_lower" MS_02DC : aliased Matreshka.Internals.Strings.Shared_String := (Capacity => 15, Unused => 14, Length => 14, Value => (16#0075#, 16#0070#, 16#0070#, 16#0065#, 16#0072#, 16#005F#, 16#0067#, 16#0065#, 16#005F#, 16#006C#, 16#006F#, 16#0077#, 16#0065#, 16#0072#, others => 16#0000#), others => <>); -- "state_is_external" MS_02DD : aliased Matreshka.Internals.Strings.Shared_String := (Capacity => 23, Unused => 17, Length => 17, Value => (16#0073#, 16#0074#, 16#0061#, 16#0074#, 16#0065#, 16#005F#, 16#0069#, 16#0073#, 16#005F#, 16#0065#, 16#0078#, 16#0074#, 16#0065#, 16#0072#, 16#006E#, 16#0061#, 16#006C#, others => 16#0000#), others => <>); -- "EnumerationLiteral" MS_02DE : aliased Matreshka.Internals.Strings.Shared_String := (Capacity => 23, Unused => 18, Length => 18, Value => (16#0045#, 16#006E#, 16#0075#, 16#006D#, 16#0065#, 16#0072#, 16#0061#, 16#0074#, 16#0069#, 16#006F#, 16#006E#, 16#004C#, 16#0069#, 16#0074#, 16#0065#, 16#0072#, 16#0061#, 16#006C#, others => 16#0000#), others => <>); -- "Include" MS_02DF : aliased Matreshka.Internals.Strings.Shared_String := (Capacity => 15, Unused => 7, Length => 7, Value => (16#0049#, 16#006E#, 16#0063#, 16#006C#, 16#0075#, 16#0064#, 16#0065#, others => 16#0000#), others => <>); -- "has_no_qualified_name" MS_02E0 : aliased Matreshka.Internals.Strings.Shared_String := (Capacity => 23, Unused => 21, Length => 21, Value => (16#0068#, 16#0061#, 16#0073#, 16#005F#, 16#006E#, 16#006F#, 16#005F#, 16#0071#, 16#0075#, 16#0061#, 16#006C#, 16#0069#, 16#0066#, 16#0069#, 16#0065#, 16#0064#, 16#005F#, 16#006E#, 16#0061#, 16#006D#, 16#0065#, others => 16#0000#), others => <>); -- "The set of messages that apply to this fragment" MS_02E1 : aliased Matreshka.Internals.Strings.Shared_String := (Capacity => 55, Unused => 47, Length => 47, Value => (16#0054#, 16#0068#, 16#0065#, 16#0020#, 16#0073#, 16#0065#, 16#0074#, 16#0020#, 16#006F#, 16#0066#, 16#0020#, 16#006D#, 16#0065#, 16#0073#, 16#0073#, 16#0061#, 16#0067#, 16#0065#, 16#0073#, 16#0020#, 16#0074#, 16#0068#, 16#0061#, 16#0074#, 16#0020#, 16#0061#, 16#0070#, 16#0070#, 16#006C#, 16#0079#, 16#0020#, 16#0074#, 16#006F#, 16#0020#, 16#0074#, 16#0068#, 16#0069#, 16#0073#, 16#0020#, 16#0066#, 16#0072#, 16#0061#, 16#0067#, 16#006D#, 16#0065#, 16#006E#, 16#0074#, others => 16#0000#), others => <>); -- "BehavioralFeature" MS_02E2 : aliased Matreshka.Internals.Strings.Shared_String := (Capacity => 23, Unused => 17, Length => 17, Value => (16#0042#, 16#0065#, 16#0068#, 16#0061#, 16#0076#, 16#0069#, 16#006F#, 16#0072#, 16#0061#, 16#006C#, 16#0046#, 16#0065#, 16#0061#, 16#0074#, 16#0075#, 16#0072#, 16#0065#, others => 16#0000#), others => <>); -- "A_addition_include" MS_02E3 : aliased Matreshka.Internals.Strings.Shared_String := (Capacity => 23, Unused => 18, Length => 18, Value => (16#0041#, 16#005F#, 16#0061#, 16#0064#, 16#0064#, 16#0069#, 16#0074#, 16#0069#, 16#006F#, 16#006E#, 16#005F#, 16#0069#, 16#006E#, 16#0063#, 16#006C#, 16#0075#, 16#0064#, 16#0065#, others => 16#0000#), others => <>); -- "type_is_classifier" MS_02E4 : aliased Matreshka.Internals.Strings.Shared_String := (Capacity => 23, Unused => 18, Length => 18, Value => (16#0074#, 16#0079#, 16#0070#, 16#0065#, 16#005F#, 16#0069#, 16#0073#, 16#005F#, 16#0063#, 16#006C#, 16#0061#, 16#0073#, 16#0073#, 16#0069#, 16#0066#, 16#0069#, 16#0065#, 16#0072#, others => 16#0000#), others => <>); -- "extendedStateMachine" MS_02E5 : aliased Matreshka.Internals.Strings.Shared_String := (Capacity => 23, Unused => 20, Length => 20, Value => (16#0065#, 16#0078#, 16#0074#, 16#0065#, 16#006E#, 16#0064#, 16#0065#, 16#0064#, 16#0053#, 16#0074#, 16#0061#, 16#0074#, 16#0065#, 16#004D#, 16#0061#, 16#0063#, 16#0068#, 16#0069#, 16#006E#, 16#0065#, others => 16#0000#), others => <>); -- "messageEnd" MS_02E6 : aliased Matreshka.Internals.Strings.Shared_String := (Capacity => 15, Unused => 10, Length => 10, Value => (16#006D#, 16#0065#, 16#0073#, 16#0073#, 16#0061#, 16#0067#, 16#0065#, 16#0045#, 16#006E#, 16#0064#, others => 16#0000#), others => <>); -- "Gives the position at which to insert a new value or move an existing value in ordered variables. The types is UnlimitedINatural, but the value cannot be zero. This pin is omitted for unordered variables." MS_02E7 : aliased Matreshka.Internals.Strings.Shared_String := (Capacity => 215, Unused => 204, Length => 204, Value => (16#0047#, 16#0069#, 16#0076#, 16#0065#, 16#0073#, 16#0020#, 16#0074#, 16#0068#, 16#0065#, 16#0020#, 16#0070#, 16#006F#, 16#0073#, 16#0069#, 16#0074#, 16#0069#, 16#006F#, 16#006E#, 16#0020#, 16#0061#, 16#0074#, 16#0020#, 16#0077#, 16#0068#, 16#0069#, 16#0063#, 16#0068#, 16#0020#, 16#0074#, 16#006F#, 16#0020#, 16#0069#, 16#006E#, 16#0073#, 16#0065#, 16#0072#, 16#0074#, 16#0020#, 16#0061#, 16#0020#, 16#006E#, 16#0065#, 16#0077#, 16#0020#, 16#0076#, 16#0061#, 16#006C#, 16#0075#, 16#0065#, 16#0020#, 16#006F#, 16#0072#, 16#0020#, 16#006D#, 16#006F#, 16#0076#, 16#0065#, 16#0020#, 16#0061#, 16#006E#, 16#0020#, 16#0065#, 16#0078#, 16#0069#, 16#0073#, 16#0074#, 16#0069#, 16#006E#, 16#0067#, 16#0020#, 16#0076#, 16#0061#, 16#006C#, 16#0075#, 16#0065#, 16#0020#, 16#0069#, 16#006E#, 16#0020#, 16#006F#, 16#0072#, 16#0064#, 16#0065#, 16#0072#, 16#0065#, 16#0064#, 16#0020#, 16#0076#, 16#0061#, 16#0072#, 16#0069#, 16#0061#, 16#0062#, 16#006C#, 16#0065#, 16#0073#, 16#002E#, 16#0020#, 16#0054#, 16#0068#, 16#0065#, 16#0020#, 16#0074#, 16#0079#, 16#0070#, 16#0065#, 16#0073#, 16#0020#, 16#0069#, 16#0073#, 16#0020#, 16#0055#, 16#006E#, 16#006C#, 16#0069#, 16#006D#, 16#0069#, 16#0074#, 16#0065#, 16#0064#, 16#0049#, 16#004E#, 16#0061#, 16#0074#, 16#0075#, 16#0072#, 16#0061#, 16#006C#, 16#002C#, 16#0020#, 16#0062#, 16#0075#, 16#0074#, 16#0020#, 16#0074#, 16#0068#, 16#0065#, 16#0020#, 16#0076#, 16#0061#, 16#006C#, 16#0075#, 16#0065#, 16#0020#, 16#0063#, 16#0061#, 16#006E#, 16#006E#, 16#006F#, 16#0074#, 16#0020#, 16#0062#, 16#0065#, 16#0020#, 16#007A#, 16#0065#, 16#0072#, 16#006F#, 16#002E#, 16#0020#, 16#0054#, 16#0068#, 16#0069#, 16#0073#, 16#0020#, 16#0070#, 16#0069#, 16#006E#, 16#0020#, 16#0069#, 16#0073#, 16#0020#, 16#006F#, 16#006D#, 16#0069#, 16#0074#, 16#0074#, 16#0065#, 16#0064#, 16#0020#, 16#0066#, 16#006F#, 16#0072#, 16#0020#, 16#0075#, 16#006E#, 16#006F#, 16#0072#, 16#0064#, 16#0065#, 16#0072#, 16#0065#, 16#0064#, 16#0020#, 16#0076#, 16#0061#, 16#0072#, 16#0069#, 16#0061#, 16#0062#, 16#006C#, 16#0065#, 16#0073#, 16#002E#, others => 16#0000#), others => <>); -- "A general ordering represents a binary relation between two occurrence specifications, to describe that one occurrence specification must occur before the other in a valid trace. This mechanism provides the ability to define partial orders of occurrence cpecifications that may otherwise not have a specified order." MS_02E8 : aliased Matreshka.Internals.Strings.Shared_String := (Capacity => 327, Unused => 315, Length => 315, Value => (16#0041#, 16#0020#, 16#0067#, 16#0065#, 16#006E#, 16#0065#, 16#0072#, 16#0061#, 16#006C#, 16#0020#, 16#006F#, 16#0072#, 16#0064#, 16#0065#, 16#0072#, 16#0069#, 16#006E#, 16#0067#, 16#0020#, 16#0072#, 16#0065#, 16#0070#, 16#0072#, 16#0065#, 16#0073#, 16#0065#, 16#006E#, 16#0074#, 16#0073#, 16#0020#, 16#0061#, 16#0020#, 16#0062#, 16#0069#, 16#006E#, 16#0061#, 16#0072#, 16#0079#, 16#0020#, 16#0072#, 16#0065#, 16#006C#, 16#0061#, 16#0074#, 16#0069#, 16#006F#, 16#006E#, 16#0020#, 16#0062#, 16#0065#, 16#0074#, 16#0077#, 16#0065#, 16#0065#, 16#006E#, 16#0020#, 16#0074#, 16#0077#, 16#006F#, 16#0020#, 16#006F#, 16#0063#, 16#0063#, 16#0075#, 16#0072#, 16#0072#, 16#0065#, 16#006E#, 16#0063#, 16#0065#, 16#0020#, 16#0073#, 16#0070#, 16#0065#, 16#0063#, 16#0069#, 16#0066#, 16#0069#, 16#0063#, 16#0061#, 16#0074#, 16#0069#, 16#006F#, 16#006E#, 16#0073#, 16#002C#, 16#0020#, 16#0074#, 16#006F#, 16#0020#, 16#0064#, 16#0065#, 16#0073#, 16#0063#, 16#0072#, 16#0069#, 16#0062#, 16#0065#, 16#0020#, 16#0074#, 16#0068#, 16#0061#, 16#0074#, 16#0020#, 16#006F#, 16#006E#, 16#0065#, 16#0020#, 16#006F#, 16#0063#, 16#0063#, 16#0075#, 16#0072#, 16#0072#, 16#0065#, 16#006E#, 16#0063#, 16#0065#, 16#0020#, 16#0073#, 16#0070#, 16#0065#, 16#0063#, 16#0069#, 16#0066#, 16#0069#, 16#0063#, 16#0061#, 16#0074#, 16#0069#, 16#006F#, 16#006E#, 16#0020#, 16#006D#, 16#0075#, 16#0073#, 16#0074#, 16#0020#, 16#006F#, 16#0063#, 16#0063#, 16#0075#, 16#0072#, 16#0020#, 16#0062#, 16#0065#, 16#0066#, 16#006F#, 16#0072#, 16#0065#, 16#0020#, 16#0074#, 16#0068#, 16#0065#, 16#0020#, 16#006F#, 16#0074#, 16#0068#, 16#0065#, 16#0072#, 16#0020#, 16#0069#, 16#006E#, 16#0020#, 16#0061#, 16#0020#, 16#0076#, 16#0061#, 16#006C#, 16#0069#, 16#0064#, 16#0020#, 16#0074#, 16#0072#, 16#0061#, 16#0063#, 16#0065#, 16#002E#, 16#0020#, 16#0054#, 16#0068#, 16#0069#, 16#0073#, 16#0020#, 16#006D#, 16#0065#, 16#0063#, 16#0068#, 16#0061#, 16#006E#, 16#0069#, 16#0073#, 16#006D#, 16#0020#, 16#0070#, 16#0072#, 16#006F#, 16#0076#, 16#0069#, 16#0064#, 16#0065#, 16#0073#, 16#0020#, 16#0074#, 16#0068#, 16#0065#, 16#0020#, 16#0061#, 16#0062#, 16#0069#, 16#006C#, 16#0069#, 16#0074#, 16#0079#, 16#0020#, 16#0074#, 16#006F#, 16#0020#, 16#0064#, 16#0065#, 16#0066#, 16#0069#, 16#006E#, 16#0065#, 16#0020#, 16#0070#, 16#0061#, 16#0072#, 16#0074#, 16#0069#, 16#0061#, 16#006C#, 16#0020#, 16#006F#, 16#0072#, 16#0064#, 16#0065#, 16#0072#, 16#0073#, 16#0020#, 16#006F#, 16#0066#, 16#0020#, 16#006F#, 16#0063#, 16#0063#, 16#0075#, 16#0072#, 16#0072#, 16#0065#, 16#006E#, 16#0063#, 16#0065#, 16#0020#, 16#0063#, 16#0070#, 16#0065#, 16#0063#, 16#0069#, 16#0066#, 16#0069#, 16#0063#, 16#0061#, 16#0074#, 16#0069#, 16#006F#, 16#006E#, 16#0073#, 16#0020#, 16#0074#, 16#0068#, 16#0061#, 16#0074#, 16#0020#, 16#006D#, 16#0061#, 16#0079#, 16#0020#, 16#006F#, 16#0074#, 16#0068#, 16#0065#, 16#0072#, 16#0077#, 16#0069#, 16#0073#, 16#0065#, 16#0020#, 16#006E#, 16#006F#, 16#0074#, 16#0020#, 16#0068#, 16#0061#, 16#0076#, 16#0065#, 16#0020#, 16#0061#, 16#0020#, 16#0073#, 16#0070#, 16#0065#, 16#0063#, 16#0069#, 16#0066#, 16#0069#, 16#0065#, 16#0064#, 16#0020#, 16#006F#, 16#0072#, 16#0064#, 16#0065#, 16#0072#, 16#002E#, others => 16#0000#), others => <>); -- "no_cycles_in_generalization" MS_02E9 : aliased Matreshka.Internals.Strings.Shared_String := (Capacity => 31, Unused => 27, Length => 27, Value => (16#006E#, 16#006F#, 16#005F#, 16#0063#, 16#0079#, 16#0063#, 16#006C#, 16#0065#, 16#0073#, 16#005F#, 16#0069#, 16#006E#, 16#005F#, 16#0067#, 16#0065#, 16#006E#, 16#0065#, 16#0072#, 16#0061#, 16#006C#, 16#0069#, 16#007A#, 16#0061#, 16#0074#, 16#0069#, 16#006F#, 16#006E#, others => 16#0000#), others => <>); -- "ProtocolTransition" MS_02EA : aliased Matreshka.Internals.Strings.Shared_String := (Capacity => 23, Unused => 18, Length => 18, Value => (16#0050#, 16#0072#, 16#006F#, 16#0074#, 16#006F#, 16#0063#, 16#006F#, 16#006C#, 16#0054#, 16#0072#, 16#0061#, 16#006E#, 16#0073#, 16#0069#, 16#0074#, 16#0069#, 16#006F#, 16#006E#, others => 16#0000#), others => <>); -- "non_leaf_redefinition" MS_02EB : aliased Matreshka.Internals.Strings.Shared_String := (Capacity => 23, Unused => 21, Length => 21, Value => (16#006E#, 16#006F#, 16#006E#, 16#005F#, 16#006C#, 16#0065#, 16#0061#, 16#0066#, 16#005F#, 16#0072#, 16#0065#, 16#0064#, 16#0065#, 16#0066#, 16#0069#, 16#006E#, 16#0069#, 16#0074#, 16#0069#, 16#006F#, 16#006E#, others => 16#0000#), others => <>); -- "The query isConsistentWith() specifies that a redefining state is consistent with a redefined state provided that the redefining state is an extension of the redefined state: A simple state can be redefined (extended) to become a composite state (by adding a region) and a composite state can be redefined (extended) by adding regions and by adding vertices, states, and transitions to inherited regions. All states may add or replace entry, exit, and 'doActivity' actions." MS_02EC : aliased Matreshka.Internals.Strings.Shared_String := (Capacity => 487, Unused => 473, Length => 473, Value => (16#0054#, 16#0068#, 16#0065#, 16#0020#, 16#0071#, 16#0075#, 16#0065#, 16#0072#, 16#0079#, 16#0020#, 16#0069#, 16#0073#, 16#0043#, 16#006F#, 16#006E#, 16#0073#, 16#0069#, 16#0073#, 16#0074#, 16#0065#, 16#006E#, 16#0074#, 16#0057#, 16#0069#, 16#0074#, 16#0068#, 16#0028#, 16#0029#, 16#0020#, 16#0073#, 16#0070#, 16#0065#, 16#0063#, 16#0069#, 16#0066#, 16#0069#, 16#0065#, 16#0073#, 16#0020#, 16#0074#, 16#0068#, 16#0061#, 16#0074#, 16#0020#, 16#0061#, 16#0020#, 16#0072#, 16#0065#, 16#0064#, 16#0065#, 16#0066#, 16#0069#, 16#006E#, 16#0069#, 16#006E#, 16#0067#, 16#0020#, 16#0073#, 16#0074#, 16#0061#, 16#0074#, 16#0065#, 16#0020#, 16#0069#, 16#0073#, 16#0020#, 16#0063#, 16#006F#, 16#006E#, 16#0073#, 16#0069#, 16#0073#, 16#0074#, 16#0065#, 16#006E#, 16#0074#, 16#0020#, 16#0077#, 16#0069#, 16#0074#, 16#0068#, 16#0020#, 16#0061#, 16#0020#, 16#0072#, 16#0065#, 16#0064#, 16#0065#, 16#0066#, 16#0069#, 16#006E#, 16#0065#, 16#0064#, 16#0020#, 16#0073#, 16#0074#, 16#0061#, 16#0074#, 16#0065#, 16#0020#, 16#0070#, 16#0072#, 16#006F#, 16#0076#, 16#0069#, 16#0064#, 16#0065#, 16#0064#, 16#0020#, 16#0074#, 16#0068#, 16#0061#, 16#0074#, 16#0020#, 16#0074#, 16#0068#, 16#0065#, 16#0020#, 16#0072#, 16#0065#, 16#0064#, 16#0065#, 16#0066#, 16#0069#, 16#006E#, 16#0069#, 16#006E#, 16#0067#, 16#0020#, 16#0073#, 16#0074#, 16#0061#, 16#0074#, 16#0065#, 16#0020#, 16#0069#, 16#0073#, 16#0020#, 16#0061#, 16#006E#, 16#0020#, 16#0065#, 16#0078#, 16#0074#, 16#0065#, 16#006E#, 16#0073#, 16#0069#, 16#006F#, 16#006E#, 16#0020#, 16#006F#, 16#0066#, 16#0020#, 16#0074#, 16#0068#, 16#0065#, 16#0020#, 16#0072#, 16#0065#, 16#0064#, 16#0065#, 16#0066#, 16#0069#, 16#006E#, 16#0065#, 16#0064#, 16#0020#, 16#0073#, 16#0074#, 16#0061#, 16#0074#, 16#0065#, 16#003A#, 16#0020#, 16#0041#, 16#0020#, 16#0073#, 16#0069#, 16#006D#, 16#0070#, 16#006C#, 16#0065#, 16#0020#, 16#0073#, 16#0074#, 16#0061#, 16#0074#, 16#0065#, 16#0020#, 16#0063#, 16#0061#, 16#006E#, 16#0020#, 16#0062#, 16#0065#, 16#0020#, 16#0072#, 16#0065#, 16#0064#, 16#0065#, 16#0066#, 16#0069#, 16#006E#, 16#0065#, 16#0064#, 16#0020#, 16#0028#, 16#0065#, 16#0078#, 16#0074#, 16#0065#, 16#006E#, 16#0064#, 16#0065#, 16#0064#, 16#0029#, 16#0020#, 16#0074#, 16#006F#, 16#0020#, 16#0062#, 16#0065#, 16#0063#, 16#006F#, 16#006D#, 16#0065#, 16#0020#, 16#0061#, 16#0020#, 16#0063#, 16#006F#, 16#006D#, 16#0070#, 16#006F#, 16#0073#, 16#0069#, 16#0074#, 16#0065#, 16#0020#, 16#0073#, 16#0074#, 16#0061#, 16#0074#, 16#0065#, 16#0020#, 16#0028#, 16#0062#, 16#0079#, 16#0020#, 16#0061#, 16#0064#, 16#0064#, 16#0069#, 16#006E#, 16#0067#, 16#0020#, 16#0061#, 16#0020#, 16#0072#, 16#0065#, 16#0067#, 16#0069#, 16#006F#, 16#006E#, 16#0029#, 16#0020#, 16#0061#, 16#006E#, 16#0064#, 16#0020#, 16#0061#, 16#0020#, 16#0063#, 16#006F#, 16#006D#, 16#0070#, 16#006F#, 16#0073#, 16#0069#, 16#0074#, 16#0065#, 16#0020#, 16#0073#, 16#0074#, 16#0061#, 16#0074#, 16#0065#, 16#0020#, 16#0063#, 16#0061#, 16#006E#, 16#0020#, 16#0062#, 16#0065#, 16#0020#, 16#0072#, 16#0065#, 16#0064#, 16#0065#, 16#0066#, 16#0069#, 16#006E#, 16#0065#, 16#0064#, 16#0020#, 16#0028#, 16#0065#, 16#0078#, 16#0074#, 16#0065#, 16#006E#, 16#0064#, 16#0065#, 16#0064#, 16#0029#, 16#0020#, 16#0062#, 16#0079#, 16#0020#, 16#0061#, 16#0064#, 16#0064#, 16#0069#, 16#006E#, 16#0067#, 16#0020#, 16#0072#, 16#0065#, 16#0067#, 16#0069#, 16#006F#, 16#006E#, 16#0073#, 16#0020#, 16#0061#, 16#006E#, 16#0064#, 16#0020#, 16#0062#, 16#0079#, 16#0020#, 16#0061#, 16#0064#, 16#0064#, 16#0069#, 16#006E#, 16#0067#, 16#0020#, 16#0076#, 16#0065#, 16#0072#, 16#0074#, 16#0069#, 16#0063#, 16#0065#, 16#0073#, 16#002C#, 16#0020#, 16#0073#, 16#0074#, 16#0061#, 16#0074#, 16#0065#, 16#0073#, 16#002C#, 16#0020#, 16#0061#, 16#006E#, 16#0064#, 16#0020#, 16#0074#, 16#0072#, 16#0061#, 16#006E#, 16#0073#, 16#0069#, 16#0074#, 16#0069#, 16#006F#, 16#006E#, 16#0073#, 16#0020#, 16#0074#, 16#006F#, 16#0020#, 16#0069#, 16#006E#, 16#0068#, 16#0065#, 16#0072#, 16#0069#, 16#0074#, 16#0065#, 16#0064#, 16#0020#, 16#0072#, 16#0065#, 16#0067#, 16#0069#, 16#006F#, 16#006E#, 16#0073#, 16#002E#, 16#0020#, 16#0041#, 16#006C#, 16#006C#, 16#0020#, 16#0073#, 16#0074#, 16#0061#, 16#0074#, 16#0065#, 16#0073#, 16#0020#, 16#006D#, 16#0061#, 16#0079#, 16#0020#, 16#0061#, 16#0064#, 16#0064#, 16#0020#, 16#006F#, 16#0072#, 16#0020#, 16#0072#, 16#0065#, 16#0070#, 16#006C#, 16#0061#, 16#0063#, 16#0065#, 16#0020#, 16#0065#, 16#006E#, 16#0074#, 16#0072#, 16#0079#, 16#002C#, 16#0020#, 16#0065#, 16#0078#, 16#0069#, 16#0074#, 16#002C#, 16#0020#, 16#0061#, 16#006E#, 16#0064#, 16#0020#, 16#0027#, 16#0064#, 16#006F#, 16#0041#, 16#0063#, 16#0074#, 16#0069#, 16#0076#, 16#0069#, 16#0074#, 16#0079#, 16#0027#, 16#0020#, 16#0061#, 16#0063#, 16#0074#, 16#0069#, 16#006F#, 16#006E#, 16#0073#, 16#002E#, others => 16#0000#), others => <>); -- "If this operation has a return parameter, isUnique equals the value of isUnique for that parameter. Otherwise isUnique is true." MS_02ED : aliased Matreshka.Internals.Strings.Shared_String := (Capacity => 135, Unused => 127, Length => 127, Value => (16#0049#, 16#0066#, 16#0020#, 16#0074#, 16#0068#, 16#0069#, 16#0073#, 16#0020#, 16#006F#, 16#0070#, 16#0065#, 16#0072#, 16#0061#, 16#0074#, 16#0069#, 16#006F#, 16#006E#, 16#0020#, 16#0068#, 16#0061#, 16#0073#, 16#0020#, 16#0061#, 16#0020#, 16#0072#, 16#0065#, 16#0074#, 16#0075#, 16#0072#, 16#006E#, 16#0020#, 16#0070#, 16#0061#, 16#0072#, 16#0061#, 16#006D#, 16#0065#, 16#0074#, 16#0065#, 16#0072#, 16#002C#, 16#0020#, 16#0069#, 16#0073#, 16#0055#, 16#006E#, 16#0069#, 16#0071#, 16#0075#, 16#0065#, 16#0020#, 16#0065#, 16#0071#, 16#0075#, 16#0061#, 16#006C#, 16#0073#, 16#0020#, 16#0074#, 16#0068#, 16#0065#, 16#0020#, 16#0076#, 16#0061#, 16#006C#, 16#0075#, 16#0065#, 16#0020#, 16#006F#, 16#0066#, 16#0020#, 16#0069#, 16#0073#, 16#0055#, 16#006E#, 16#0069#, 16#0071#, 16#0075#, 16#0065#, 16#0020#, 16#0066#, 16#006F#, 16#0072#, 16#0020#, 16#0074#, 16#0068#, 16#0061#, 16#0074#, 16#0020#, 16#0070#, 16#0061#, 16#0072#, 16#0061#, 16#006D#, 16#0065#, 16#0074#, 16#0065#, 16#0072#, 16#002E#, 16#0020#, 16#004F#, 16#0074#, 16#0068#, 16#0065#, 16#0072#, 16#0077#, 16#0069#, 16#0073#, 16#0065#, 16#0020#, 16#0069#, 16#0073#, 16#0055#, 16#006E#, 16#0069#, 16#0071#, 16#0075#, 16#0065#, 16#0020#, 16#0069#, 16#0073#, 16#0020#, 16#0074#, 16#0072#, 16#0075#, 16#0065#, 16#002E#, others => 16#0000#), others => <>); -- "A variable is owned by a StructuredNode or Activity, but not both." MS_02EE : aliased Matreshka.Internals.Strings.Shared_String := (Capacity => 71, Unused => 66, Length => 66, Value => (16#0041#, 16#0020#, 16#0076#, 16#0061#, 16#0072#, 16#0069#, 16#0061#, 16#0062#, 16#006C#, 16#0065#, 16#0020#, 16#0069#, 16#0073#, 16#0020#, 16#006F#, 16#0077#, 16#006E#, 16#0065#, 16#0064#, 16#0020#, 16#0062#, 16#0079#, 16#0020#, 16#0061#, 16#0020#, 16#0053#, 16#0074#, 16#0072#, 16#0075#, 16#0063#, 16#0074#, 16#0075#, 16#0072#, 16#0065#, 16#0064#, 16#004E#, 16#006F#, 16#0064#, 16#0065#, 16#0020#, 16#006F#, 16#0072#, 16#0020#, 16#0041#, 16#0063#, 16#0074#, 16#0069#, 16#0076#, 16#0069#, 16#0074#, 16#0079#, 16#002C#, 16#0020#, 16#0062#, 16#0075#, 16#0074#, 16#0020#, 16#006E#, 16#006F#, 16#0074#, 16#0020#, 16#0062#, 16#006F#, 16#0074#, 16#0068#, 16#002E#, others => 16#0000#), others => <>); -- "FinalState" MS_02EF : aliased Matreshka.Internals.Strings.Shared_String := (Capacity => 15, Unused => 10, Length => 10, Value => (16#0046#, 16#0069#, 16#006E#, 16#0061#, 16#006C#, 16#0053#, 16#0074#, 16#0061#, 16#0074#, 16#0065#, others => 16#0000#), others => <>); -- "A decision node is a control node that chooses between outgoing flows." MS_02F0 : aliased Matreshka.Internals.Strings.Shared_String := (Capacity => 79, Unused => 70, Length => 70, Value => (16#0041#, 16#0020#, 16#0064#, 16#0065#, 16#0063#, 16#0069#, 16#0073#, 16#0069#, 16#006F#, 16#006E#, 16#0020#, 16#006E#, 16#006F#, 16#0064#, 16#0065#, 16#0020#, 16#0069#, 16#0073#, 16#0020#, 16#0061#, 16#0020#, 16#0063#, 16#006F#, 16#006E#, 16#0074#, 16#0072#, 16#006F#, 16#006C#, 16#0020#, 16#006E#, 16#006F#, 16#0064#, 16#0065#, 16#0020#, 16#0074#, 16#0068#, 16#0061#, 16#0074#, 16#0020#, 16#0063#, 16#0068#, 16#006F#, 16#006F#, 16#0073#, 16#0065#, 16#0073#, 16#0020#, 16#0062#, 16#0065#, 16#0074#, 16#0077#, 16#0065#, 16#0065#, 16#006E#, 16#0020#, 16#006F#, 16#0075#, 16#0074#, 16#0067#, 16#006F#, 16#0069#, 16#006E#, 16#0067#, 16#0020#, 16#0066#, 16#006C#, 16#006F#, 16#0077#, 16#0073#, 16#002E#, others => 16#0000#), others => <>); -- "localPostcondition" MS_02F1 : aliased Matreshka.Internals.Strings.Shared_String := (Capacity => 23, Unused => 18, Length => 18, Value => (16#006C#, 16#006F#, 16#0063#, 16#0061#, 16#006C#, 16#0050#, 16#006F#, 16#0073#, 16#0074#, 16#0063#, 16#006F#, 16#006E#, 16#0064#, 16#0069#, 16#0074#, 16#0069#, 16#006F#, 16#006E#, others => 16#0000#), others => <>); -- "Actual Gates of the InteractionUse must match Formal Gates of the referred Interaction. Gates match when their names are equal." MS_02F2 : aliased Matreshka.Internals.Strings.Shared_String := (Capacity => 135, Unused => 127, Length => 127, Value => (16#0041#, 16#0063#, 16#0074#, 16#0075#, 16#0061#, 16#006C#, 16#0020#, 16#0047#, 16#0061#, 16#0074#, 16#0065#, 16#0073#, 16#0020#, 16#006F#, 16#0066#, 16#0020#, 16#0074#, 16#0068#, 16#0065#, 16#0020#, 16#0049#, 16#006E#, 16#0074#, 16#0065#, 16#0072#, 16#0061#, 16#0063#, 16#0074#, 16#0069#, 16#006F#, 16#006E#, 16#0055#, 16#0073#, 16#0065#, 16#0020#, 16#006D#, 16#0075#, 16#0073#, 16#0074#, 16#0020#, 16#006D#, 16#0061#, 16#0074#, 16#0063#, 16#0068#, 16#0020#, 16#0046#, 16#006F#, 16#0072#, 16#006D#, 16#0061#, 16#006C#, 16#0020#, 16#0047#, 16#0061#, 16#0074#, 16#0065#, 16#0073#, 16#0020#, 16#006F#, 16#0066#, 16#0020#, 16#0074#, 16#0068#, 16#0065#, 16#0020#, 16#0072#, 16#0065#, 16#0066#, 16#0065#, 16#0072#, 16#0072#, 16#0065#, 16#0064#, 16#0020#, 16#0049#, 16#006E#, 16#0074#, 16#0065#, 16#0072#, 16#0061#, 16#0063#, 16#0074#, 16#0069#, 16#006F#, 16#006E#, 16#002E#, 16#0020#, 16#0047#, 16#0061#, 16#0074#, 16#0065#, 16#0073#, 16#0020#, 16#006D#, 16#0061#, 16#0074#, 16#0063#, 16#0068#, 16#0020#, 16#0077#, 16#0068#, 16#0065#, 16#006E#, 16#0020#, 16#0074#, 16#0068#, 16#0065#, 16#0069#, 16#0072#, 16#0020#, 16#006E#, 16#0061#, 16#006D#, 16#0065#, 16#0073#, 16#0020#, 16#0061#, 16#0072#, 16#0065#, 16#0020#, 16#0065#, 16#0071#, 16#0075#, 16#0061#, 16#006C#, 16#002E#, others => 16#0000#), others => <>); -- "The collaboration which is used in this occurrence. The collaboration defines the cooperation between its roles which are mapped to properties of the classifier owning the collaboration use." MS_02F3 : aliased Matreshka.Internals.Strings.Shared_String := (Capacity => 199, Unused => 190, Length => 190, Value => (16#0054#, 16#0068#, 16#0065#, 16#0020#, 16#0063#, 16#006F#, 16#006C#, 16#006C#, 16#0061#, 16#0062#, 16#006F#, 16#0072#, 16#0061#, 16#0074#, 16#0069#, 16#006F#, 16#006E#, 16#0020#, 16#0077#, 16#0068#, 16#0069#, 16#0063#, 16#0068#, 16#0020#, 16#0069#, 16#0073#, 16#0020#, 16#0075#, 16#0073#, 16#0065#, 16#0064#, 16#0020#, 16#0069#, 16#006E#, 16#0020#, 16#0074#, 16#0068#, 16#0069#, 16#0073#, 16#0020#, 16#006F#, 16#0063#, 16#0063#, 16#0075#, 16#0072#, 16#0072#, 16#0065#, 16#006E#, 16#0063#, 16#0065#, 16#002E#, 16#0020#, 16#0054#, 16#0068#, 16#0065#, 16#0020#, 16#0063#, 16#006F#, 16#006C#, 16#006C#, 16#0061#, 16#0062#, 16#006F#, 16#0072#, 16#0061#, 16#0074#, 16#0069#, 16#006F#, 16#006E#, 16#0020#, 16#0064#, 16#0065#, 16#0066#, 16#0069#, 16#006E#, 16#0065#, 16#0073#, 16#0020#, 16#0074#, 16#0068#, 16#0065#, 16#0020#, 16#0063#, 16#006F#, 16#006F#, 16#0070#, 16#0065#, 16#0072#, 16#0061#, 16#0074#, 16#0069#, 16#006F#, 16#006E#, 16#0020#, 16#0062#, 16#0065#, 16#0074#, 16#0077#, 16#0065#, 16#0065#, 16#006E#, 16#0020#, 16#0069#, 16#0074#, 16#0073#, 16#0020#, 16#0072#, 16#006F#, 16#006C#, 16#0065#, 16#0073#, 16#0020#, 16#0077#, 16#0068#, 16#0069#, 16#0063#, 16#0068#, 16#0020#, 16#0061#, 16#0072#, 16#0065#, 16#0020#, 16#006D#, 16#0061#, 16#0070#, 16#0070#, 16#0065#, 16#0064#, 16#0020#, 16#0074#, 16#006F#, 16#0020#, 16#0070#, 16#0072#, 16#006F#, 16#0070#, 16#0065#, 16#0072#, 16#0074#, 16#0069#, 16#0065#, 16#0073#, 16#0020#, 16#006F#, 16#0066#, 16#0020#, 16#0074#, 16#0068#, 16#0065#, 16#0020#, 16#0063#, 16#006C#, 16#0061#, 16#0073#, 16#0073#, 16#0069#, 16#0066#, 16#0069#, 16#0065#, 16#0072#, 16#0020#, 16#006F#, 16#0077#, 16#006E#, 16#0069#, 16#006E#, 16#0067#, 16#0020#, 16#0074#, 16#0068#, 16#0065#, 16#0020#, 16#0063#, 16#006F#, 16#006C#, 16#006C#, 16#0061#, 16#0062#, 16#006F#, 16#0072#, 16#0061#, 16#0074#, 16#0069#, 16#006F#, 16#006E#, 16#0020#, 16#0075#, 16#0073#, 16#0065#, 16#002E#, others => 16#0000#), others => <>); -- "spec" MS_02F4 : aliased Matreshka.Internals.Strings.Shared_String := (Capacity => 7, Unused => 4, Length => 4, Value => (16#0073#, 16#0070#, 16#0065#, 16#0063#, others => 16#0000#), others => <>); -- "A control node is an abstract activity node that coordinates flows in an activity." MS_02F5 : aliased Matreshka.Internals.Strings.Shared_String := (Capacity => 87, Unused => 82, Length => 82, Value => (16#0041#, 16#0020#, 16#0063#, 16#006F#, 16#006E#, 16#0074#, 16#0072#, 16#006F#, 16#006C#, 16#0020#, 16#006E#, 16#006F#, 16#0064#, 16#0065#, 16#0020#, 16#0069#, 16#0073#, 16#0020#, 16#0061#, 16#006E#, 16#0020#, 16#0061#, 16#0062#, 16#0073#, 16#0074#, 16#0072#, 16#0061#, 16#0063#, 16#0074#, 16#0020#, 16#0061#, 16#0063#, 16#0074#, 16#0069#, 16#0076#, 16#0069#, 16#0074#, 16#0079#, 16#0020#, 16#006E#, 16#006F#, 16#0064#, 16#0065#, 16#0020#, 16#0074#, 16#0068#, 16#0061#, 16#0074#, 16#0020#, 16#0063#, 16#006F#, 16#006F#, 16#0072#, 16#0064#, 16#0069#, 16#006E#, 16#0061#, 16#0074#, 16#0065#, 16#0073#, 16#0020#, 16#0066#, 16#006C#, 16#006F#, 16#0077#, 16#0073#, 16#0020#, 16#0069#, 16#006E#, 16#0020#, 16#0061#, 16#006E#, 16#0020#, 16#0061#, 16#0063#, 16#0074#, 16#0069#, 16#0076#, 16#0069#, 16#0074#, 16#0079#, 16#002E#, others => 16#0000#), others => <>); -- "delete" MS_02F6 : aliased Matreshka.Internals.Strings.Shared_String := (Capacity => 7, Unused => 6, Length => 6, Value => (16#0064#, 16#0065#, 16#006C#, 16#0065#, 16#0074#, 16#0065#, others => 16#0000#), others => <>); -- "TemplateParameterSubstitution" MS_02F7 : aliased Matreshka.Internals.Strings.Shared_String := (Capacity => 31, Unused => 29, Length => 29, Value => (16#0054#, 16#0065#, 16#006D#, 16#0070#, 16#006C#, 16#0061#, 16#0074#, 16#0065#, 16#0050#, 16#0061#, 16#0072#, 16#0061#, 16#006D#, 16#0065#, 16#0074#, 16#0065#, 16#0072#, 16#0053#, 16#0075#, 16#0062#, 16#0073#, 16#0074#, 16#0069#, 16#0074#, 16#0075#, 16#0074#, 16#0069#, 16#006F#, 16#006E#, others => 16#0000#), others => <>); -- "referred" MS_02F8 : aliased Matreshka.Internals.Strings.Shared_String := (Capacity => 15, Unused => 8, Length => 8, Value => (16#0072#, 16#0065#, 16#0066#, 16#0065#, 16#0072#, 16#0072#, 16#0065#, 16#0064#, others => 16#0000#), others => <>); -- "The query metaclassEnd() returns the Property that is typed by a metaclass (as opposed to a stereotype)." MS_02F9 : aliased Matreshka.Internals.Strings.Shared_String := (Capacity => 111, Unused => 104, Length => 104, Value => (16#0054#, 16#0068#, 16#0065#, 16#0020#, 16#0071#, 16#0075#, 16#0065#, 16#0072#, 16#0079#, 16#0020#, 16#006D#, 16#0065#, 16#0074#, 16#0061#, 16#0063#, 16#006C#, 16#0061#, 16#0073#, 16#0073#, 16#0045#, 16#006E#, 16#0064#, 16#0028#, 16#0029#, 16#0020#, 16#0072#, 16#0065#, 16#0074#, 16#0075#, 16#0072#, 16#006E#, 16#0073#, 16#0020#, 16#0074#, 16#0068#, 16#0065#, 16#0020#, 16#0050#, 16#0072#, 16#006F#, 16#0070#, 16#0065#, 16#0072#, 16#0074#, 16#0079#, 16#0020#, 16#0074#, 16#0068#, 16#0061#, 16#0074#, 16#0020#, 16#0069#, 16#0073#, 16#0020#, 16#0074#, 16#0079#, 16#0070#, 16#0065#, 16#0064#, 16#0020#, 16#0062#, 16#0079#, 16#0020#, 16#0061#, 16#0020#, 16#006D#, 16#0065#, 16#0074#, 16#0061#, 16#0063#, 16#006C#, 16#0061#, 16#0073#, 16#0073#, 16#0020#, 16#0028#, 16#0061#, 16#0073#, 16#0020#, 16#006F#, 16#0070#, 16#0070#, 16#006F#, 16#0073#, 16#0065#, 16#0064#, 16#0020#, 16#0074#, 16#006F#, 16#0020#, 16#0061#, 16#0020#, 16#0073#, 16#0074#, 16#0065#, 16#0072#, 16#0065#, 16#006F#, 16#0074#, 16#0079#, 16#0070#, 16#0065#, 16#0029#, 16#002E#, others => 16#0000#), others => <>); -- "qualifier_attribute" MS_02FA : aliased Matreshka.Internals.Strings.Shared_String := (Capacity => 23, Unused => 19, Length => 19, Value => (16#0071#, 16#0075#, 16#0061#, 16#006C#, 16#0069#, 16#0066#, 16#0069#, 16#0065#, 16#0072#, 16#005F#, 16#0061#, 16#0074#, 16#0074#, 16#0072#, 16#0069#, 16#0062#, 16#0075#, 16#0074#, 16#0065#, others => 16#0000#), others => <>); -- "A raise exception action is an action that causes an exception to occur. The input value becomes the exception object." MS_02FB : aliased Matreshka.Internals.Strings.Shared_String := (Capacity => 127, Unused => 118, Length => 118, Value => (16#0041#, 16#0020#, 16#0072#, 16#0061#, 16#0069#, 16#0073#, 16#0065#, 16#0020#, 16#0065#, 16#0078#, 16#0063#, 16#0065#, 16#0070#, 16#0074#, 16#0069#, 16#006F#, 16#006E#, 16#0020#, 16#0061#, 16#0063#, 16#0074#, 16#0069#, 16#006F#, 16#006E#, 16#0020#, 16#0069#, 16#0073#, 16#0020#, 16#0061#, 16#006E#, 16#0020#, 16#0061#, 16#0063#, 16#0074#, 16#0069#, 16#006F#, 16#006E#, 16#0020#, 16#0074#, 16#0068#, 16#0061#, 16#0074#, 16#0020#, 16#0063#, 16#0061#, 16#0075#, 16#0073#, 16#0065#, 16#0073#, 16#0020#, 16#0061#, 16#006E#, 16#0020#, 16#0065#, 16#0078#, 16#0063#, 16#0065#, 16#0070#, 16#0074#, 16#0069#, 16#006F#, 16#006E#, 16#0020#, 16#0074#, 16#006F#, 16#0020#, 16#006F#, 16#0063#, 16#0063#, 16#0075#, 16#0072#, 16#002E#, 16#0020#, 16#0054#, 16#0068#, 16#0065#, 16#0020#, 16#0069#, 16#006E#, 16#0070#, 16#0075#, 16#0074#, 16#0020#, 16#0076#, 16#0061#, 16#006C#, 16#0075#, 16#0065#, 16#0020#, 16#0062#, 16#0065#, 16#0063#, 16#006F#, 16#006D#, 16#0065#, 16#0073#, 16#0020#, 16#0074#, 16#0068#, 16#0065#, 16#0020#, 16#0065#, 16#0078#, 16#0063#, 16#0065#, 16#0070#, 16#0074#, 16#0069#, 16#006F#, 16#006E#, 16#0020#, 16#006F#, 16#0062#, 16#006A#, 16#0065#, 16#0063#, 16#0074#, 16#002E#, others => 16#0000#), others => <>); -- "Indicates that object node tokens are unordered." MS_02FC : aliased Matreshka.Internals.Strings.Shared_String := (Capacity => 55, Unused => 48, Length => 48, Value => (16#0049#, 16#006E#, 16#0064#, 16#0069#, 16#0063#, 16#0061#, 16#0074#, 16#0065#, 16#0073#, 16#0020#, 16#0074#, 16#0068#, 16#0061#, 16#0074#, 16#0020#, 16#006F#, 16#0062#, 16#006A#, 16#0065#, 16#0063#, 16#0074#, 16#0020#, 16#006E#, 16#006F#, 16#0064#, 16#0065#, 16#0020#, 16#0074#, 16#006F#, 16#006B#, 16#0065#, 16#006E#, 16#0073#, 16#0020#, 16#0061#, 16#0072#, 16#0065#, 16#0020#, 16#0075#, 16#006E#, 16#006F#, 16#0072#, 16#0064#, 16#0065#, 16#0072#, 16#0065#, 16#0064#, 16#002E#, others => 16#0000#), others => <>); -- "The query containingProfile returns the closest profile directly or indirectly containing this stereotype." MS_02FD : aliased Matreshka.Internals.Strings.Shared_String := (Capacity => 111, Unused => 106, Length => 106, Value => (16#0054#, 16#0068#, 16#0065#, 16#0020#, 16#0071#, 16#0075#, 16#0065#, 16#0072#, 16#0079#, 16#0020#, 16#0063#, 16#006F#, 16#006E#, 16#0074#, 16#0061#, 16#0069#, 16#006E#, 16#0069#, 16#006E#, 16#0067#, 16#0050#, 16#0072#, 16#006F#, 16#0066#, 16#0069#, 16#006C#, 16#0065#, 16#0020#, 16#0072#, 16#0065#, 16#0074#, 16#0075#, 16#0072#, 16#006E#, 16#0073#, 16#0020#, 16#0074#, 16#0068#, 16#0065#, 16#0020#, 16#0063#, 16#006C#, 16#006F#, 16#0073#, 16#0065#, 16#0073#, 16#0074#, 16#0020#, 16#0070#, 16#0072#, 16#006F#, 16#0066#, 16#0069#, 16#006C#, 16#0065#, 16#0020#, 16#0064#, 16#0069#, 16#0072#, 16#0065#, 16#0063#, 16#0074#, 16#006C#, 16#0079#, 16#0020#, 16#006F#, 16#0072#, 16#0020#, 16#0069#, 16#006E#, 16#0064#, 16#0069#, 16#0072#, 16#0065#, 16#0063#, 16#0074#, 16#006C#, 16#0079#, 16#0020#, 16#0063#, 16#006F#, 16#006E#, 16#0074#, 16#0061#, 16#0069#, 16#006E#, 16#0069#, 16#006E#, 16#0067#, 16#0020#, 16#0074#, 16#0068#, 16#0069#, 16#0073#, 16#0020#, 16#0073#, 16#0074#, 16#0065#, 16#0072#, 16#0065#, 16#006F#, 16#0074#, 16#0079#, 16#0070#, 16#0065#, 16#002E#, others => 16#0000#), others => <>); -- "A_node_activity" MS_02FE : aliased Matreshka.Internals.Strings.Shared_String := (Capacity => 23, Unused => 15, Length => 15, Value => (16#0041#, 16#005F#, 16#006E#, 16#006F#, 16#0064#, 16#0065#, 16#005F#, 16#0061#, 16#0063#, 16#0074#, 16#0069#, 16#0076#, 16#0069#, 16#0074#, 16#0079#, others => 16#0000#), others => <>); -- "A template binding represents a relationship between a templateable element and a template. A template binding specifies the substitutions of actual parameters for the formal parameters of the template." MS_02FF : aliased Matreshka.Internals.Strings.Shared_String := (Capacity => 215, Unused => 202, Length => 202, Value => (16#0041#, 16#0020#, 16#0074#, 16#0065#, 16#006D#, 16#0070#, 16#006C#, 16#0061#, 16#0074#, 16#0065#, 16#0020#, 16#0062#, 16#0069#, 16#006E#, 16#0064#, 16#0069#, 16#006E#, 16#0067#, 16#0020#, 16#0072#, 16#0065#, 16#0070#, 16#0072#, 16#0065#, 16#0073#, 16#0065#, 16#006E#, 16#0074#, 16#0073#, 16#0020#, 16#0061#, 16#0020#, 16#0072#, 16#0065#, 16#006C#, 16#0061#, 16#0074#, 16#0069#, 16#006F#, 16#006E#, 16#0073#, 16#0068#, 16#0069#, 16#0070#, 16#0020#, 16#0062#, 16#0065#, 16#0074#, 16#0077#, 16#0065#, 16#0065#, 16#006E#, 16#0020#, 16#0061#, 16#0020#, 16#0074#, 16#0065#, 16#006D#, 16#0070#, 16#006C#, 16#0061#, 16#0074#, 16#0065#, 16#0061#, 16#0062#, 16#006C#, 16#0065#, 16#0020#, 16#0065#, 16#006C#, 16#0065#, 16#006D#, 16#0065#, 16#006E#, 16#0074#, 16#0020#, 16#0061#, 16#006E#, 16#0064#, 16#0020#, 16#0061#, 16#0020#, 16#0074#, 16#0065#, 16#006D#, 16#0070#, 16#006C#, 16#0061#, 16#0074#, 16#0065#, 16#002E#, 16#0020#, 16#0041#, 16#0020#, 16#0074#, 16#0065#, 16#006D#, 16#0070#, 16#006C#, 16#0061#, 16#0074#, 16#0065#, 16#0020#, 16#0062#, 16#0069#, 16#006E#, 16#0064#, 16#0069#, 16#006E#, 16#0067#, 16#0020#, 16#0073#, 16#0070#, 16#0065#, 16#0063#, 16#0069#, 16#0066#, 16#0069#, 16#0065#, 16#0073#, 16#0020#, 16#0074#, 16#0068#, 16#0065#, 16#0020#, 16#0073#, 16#0075#, 16#0062#, 16#0073#, 16#0074#, 16#0069#, 16#0074#, 16#0075#, 16#0074#, 16#0069#, 16#006F#, 16#006E#, 16#0073#, 16#0020#, 16#006F#, 16#0066#, 16#0020#, 16#0061#, 16#0063#, 16#0074#, 16#0075#, 16#0061#, 16#006C#, 16#0020#, 16#0070#, 16#0061#, 16#0072#, 16#0061#, 16#006D#, 16#0065#, 16#0074#, 16#0065#, 16#0072#, 16#0073#, 16#0020#, 16#0066#, 16#006F#, 16#0072#, 16#0020#, 16#0074#, 16#0068#, 16#0065#, 16#0020#, 16#0066#, 16#006F#, 16#0072#, 16#006D#, 16#0061#, 16#006C#, 16#0020#, 16#0070#, 16#0061#, 16#0072#, 16#0061#, 16#006D#, 16#0065#, 16#0074#, 16#0065#, 16#0072#, 16#0073#, 16#0020#, 16#006F#, 16#0066#, 16#0020#, 16#0074#, 16#0068#, 16#0065#, 16#0020#, 16#0074#, 16#0065#, 16#006D#, 16#0070#, 16#006C#, 16#0061#, 16#0074#, 16#0065#, 16#002E#, others => 16#0000#), others => <>); end AMF.Internals.Tables.UML_String_Data_02;
oresat/oresat-c3-rf
Ada
32,456
adb
M:main F:Fmain$pwrmgmt_irq$0$0({2}DF,SV:S),C,0,0,1,6,0 F:Fmain$transmit_packet$0$0({2}DF,SV:S),C,0,0,0,0,0 F:Fmain$display_transmit_packet$0$0({2}DF,SV:S),C,0,0,0,0,0 F:G$axradio_statuschange$0$0({2}DF,SV:S),Z,0,0,0,0,0 F:G$enable_radio_interrupt_in_mcu_pin$0$0({2}DF,SV:S),Z,0,0,0,0,0 F:G$disable_radio_interrupt_in_mcu_pin$0$0({2}DF,SV:S),Z,0,0,0,0,0 F:Fmain$wakeup_callback$0$0({2}DF,SV:S),C,0,0,0,0,0 F:G$_sdcc_external_startup$0$0({2}DF,SC:U),C,0,0,0,0,0 F:G$main$0$0({2}DF,SI:S),C,0,0,0,0,0 F:G$main$0$0({2}DF,SI:S),C,0,0,0,0,0 T:Fmain$wtimer_callback[({0}S:S$next$0$0({2}DX,STwtimer_callback:S),Z,0,0)({2}S:S$handler$0$0({2}DC,DF,SV:S),Z,0,0)] T:Fmain$axradio_status_receive[({0}S:S$phy$0$0({10}STaxradio_status_receive_phy:S),Z,0,0)({10}S:S$mac$0$0({12}STaxradio_status_receive_mac:S),Z,0,0)({22}S:S$pktdata$0$0({2}DX,SC:U),Z,0,0)({24}S:S$pktlen$0$0({2}SI:U),Z,0,0)] T:Fmain$axradio_address[({0}S:S$addr$0$0({5}DA5d,SC:U),Z,0,0)] T:Fmain$axradio_address_mask[({0}S:S$addr$0$0({5}DA5d,SC:U),Z,0,0)({5}S:S$mask$0$0({5}DA5d,SC:U),Z,0,0)] T:Fmain$__00000000[({0}S:S$rx$0$0({26}STaxradio_status_receive:S),Z,0,0)({0}S:S$cs$0$0({3}STaxradio_status_channelstate:S),Z,0,0)] T:Fmain$axradio_status_channelstate[({0}S:S$rssi$0$0({2}SI:S),Z,0,0)({2}S:S$busy$0$0({1}SC:U),Z,0,0)] T:Fmain$u32endian[({0}S:S$b0$0$0({1}SC:U),Z,0,0)({1}S:S$b1$0$0({1}SC:U),Z,0,0)({2}S:S$b2$0$0({1}SC:U),Z,0,0)({3}S:S$b3$0$0({1}SC:U),Z,0,0)] T:Fmain$u16endian[({0}S:S$b0$0$0({1}SC:U),Z,0,0)({1}S:S$b1$0$0({1}SC:U),Z,0,0)] T:Fmain$wtimer_desc[({0}S:S$next$0$0({2}DX,STwtimer_desc:S),Z,0,0)({2}S:S$handler$0$0({2}DC,DF,SV:S),Z,0,0)({4}S:S$time$0$0({4}SL:U),Z,0,0)] T:Fmain$axradio_status_receive_mac[({0}S:S$remoteaddr$0$0({5}DA5d,SC:U),Z,0,0)({5}S:S$localaddr$0$0({5}DA5d,SC:U),Z,0,0)({10}S:S$raw$0$0({2}DX,SC:U),Z,0,0)] T:Fmain$calsector[({0}S:S$id$0$0({5}DA5d,SC:U),Z,0,0)({5}S:S$len$0$0({1}SC:U),Z,0,0)({6}S:S$devid$0$0({6}DA6d,SC:U),Z,0,0)({12}S:S$calg00gain$0$0({2}DA2d,SC:U),Z,0,0)({14}S:S$calg01gain$0$0({2}DA2d,SC:U),Z,0,0)({16}S:S$calg10gain$0$0({2}DA2d,SC:U),Z,0,0)({18}S:S$caltempgain$0$0({2}DA2d,SC:U),Z,0,0)({20}S:S$caltempoffs$0$0({2}DA2d,SC:U),Z,0,0)({22}S:S$frcoscfreq$0$0({2}DA2d,SC:U),Z,0,0)({24}S:S$lposcfreq$0$0({2}DA2d,SC:U),Z,0,0)({26}S:S$lposcfreq_fast$0$0({2}DA2d,SC:U),Z,0,0)({28}S:S$powctrl0$0$0({1}SC:U),Z,0,0)({29}S:S$powctrl1$0$0({1}SC:U),Z,0,0)({30}S:S$ref$0$0({1}SC:U),Z,0,0)] T:Fmain$axradio_status_receive_phy[({0}S:S$rssi$0$0({2}SI:S),Z,0,0)({2}S:S$offset$0$0({4}SL:S),Z,0,0)({6}S:S$timeoffset$0$0({2}SI:S),Z,0,0)({8}S:S$period$0$0({2}SI:S),Z,0,0)] T:Fmain$axradio_status[({0}S:S$status$0$0({1}SC:U),Z,0,0)({1}S:S$error$0$0({1}SC:U),Z,0,0)({2}S:S$time$0$0({4}SL:U),Z,0,0)({6}S:S$u$0$0({26}ST__00000000:S),Z,0,0)] S:G$random_seed$0$0({2}SI:U),E,0,0 S:G$wtimer0_clksrc$0$0({1}SC:U),E,0,0 S:G$wtimer1_clksrc$0$0({1}SC:U),E,0,0 S:G$wtimer1_prescaler$0$0({1}SC:U),E,0,0 S:G$_start__stack$0$0({0}DA0d,SC:U),E,0,0 S:G$pkt_counter$0$0({2}SI:U),E,0,0 S:G$coldstart$0$0({1}SC:U),E,0,0 S:Lmain.enter_critical$crit$1$29({1}SC:U),E,0,0 S:Lmain.exit_critical$crit$1$30({1}SC:U),E,0,0 S:Lmain.pwrmgmt_irq$pc$1$364({1}SC:U),R,0,0,[r7] S:Lmain.wakeup_callback$desc$1$398({2}DX,STwtimer_desc:S),R,0,0,[] S:Lmain._sdcc_external_startup$c$2$402({1}SC:U),R,0,0,[] S:Lmain._sdcc_external_startup$p$2$402({1}SC:U),R,0,0,[] S:Lmain._sdcc_external_startup$c$2$403({1}SC:U),R,0,0,[] S:Lmain._sdcc_external_startup$p$2$403({1}SC:U),R,0,0,[] S:Lmain.main$saved_button_state$1$405({1}SC:U),E,0,0 S:Lmain.main$i$1$405({1}SC:U),R,0,0,[r7] S:Lmain.main$x$3$417({1}SC:U),R,0,0,[r6] S:Lmain.main$flg$3$421({1}SC:U),R,0,0,[r6] S:Lmain.main$flg$3$423({1}SC:U),R,0,0,[r7] S:Lmain._sdcc_external_startup$sloc0$1$0({1}SB0$0:S),H,0,0 S:G$ADCCH0VAL0$0$0({1}SC:U),F,0,0 S:G$ADCCH0VAL1$0$0({1}SC:U),F,0,0 S:G$ADCCH0VAL$0$0({2}SI:U),F,0,0 S:G$ADCCH1VAL0$0$0({1}SC:U),F,0,0 S:G$ADCCH1VAL1$0$0({1}SC:U),F,0,0 S:G$ADCCH1VAL$0$0({2}SI:U),F,0,0 S:G$ADCCH2VAL0$0$0({1}SC:U),F,0,0 S:G$ADCCH2VAL1$0$0({1}SC:U),F,0,0 S:G$ADCCH2VAL$0$0({2}SI:U),F,0,0 S:G$ADCCH3VAL0$0$0({1}SC:U),F,0,0 S:G$ADCCH3VAL1$0$0({1}SC:U),F,0,0 S:G$ADCCH3VAL$0$0({2}SI:U),F,0,0 S:G$ADCTUNE0$0$0({1}SC:U),F,0,0 S:G$ADCTUNE1$0$0({1}SC:U),F,0,0 S:G$ADCTUNE2$0$0({1}SC:U),F,0,0 S:G$DMA0ADDR0$0$0({1}SC:U),F,0,0 S:G$DMA0ADDR1$0$0({1}SC:U),F,0,0 S:G$DMA0ADDR$0$0({2}SI:U),F,0,0 S:G$DMA0CONFIG$0$0({1}SC:U),F,0,0 S:G$DMA1ADDR0$0$0({1}SC:U),F,0,0 S:G$DMA1ADDR1$0$0({1}SC:U),F,0,0 S:G$DMA1ADDR$0$0({2}SI:U),F,0,0 S:G$DMA1CONFIG$0$0({1}SC:U),F,0,0 S:G$FRCOSCCONFIG$0$0({1}SC:U),F,0,0 S:G$FRCOSCCTRL$0$0({1}SC:U),F,0,0 S:G$FRCOSCFREQ0$0$0({1}SC:U),F,0,0 S:G$FRCOSCFREQ1$0$0({1}SC:U),F,0,0 S:G$FRCOSCFREQ$0$0({2}SI:U),F,0,0 S:G$FRCOSCKFILT0$0$0({1}SC:U),F,0,0 S:G$FRCOSCKFILT1$0$0({1}SC:U),F,0,0 S:G$FRCOSCKFILT$0$0({2}SI:U),F,0,0 S:G$FRCOSCPER0$0$0({1}SC:U),F,0,0 S:G$FRCOSCPER1$0$0({1}SC:U),F,0,0 S:G$FRCOSCPER$0$0({2}SI:U),F,0,0 S:G$FRCOSCREF0$0$0({1}SC:U),F,0,0 S:G$FRCOSCREF1$0$0({1}SC:U),F,0,0 S:G$FRCOSCREF$0$0({2}SI:U),F,0,0 S:G$ANALOGA$0$0({1}SC:U),F,0,0 S:G$GPIOENABLE$0$0({1}SC:U),F,0,0 S:G$EXTIRQ$0$0({1}SC:U),F,0,0 S:G$INTCHGA$0$0({1}SC:U),F,0,0 S:G$INTCHGB$0$0({1}SC:U),F,0,0 S:G$INTCHGC$0$0({1}SC:U),F,0,0 S:G$PALTA$0$0({1}SC:U),F,0,0 S:G$PALTB$0$0({1}SC:U),F,0,0 S:G$PALTC$0$0({1}SC:U),F,0,0 S:G$PALTRADIO$0$0({1}SC:U),F,0,0 S:G$PINCHGA$0$0({1}SC:U),F,0,0 S:G$PINCHGB$0$0({1}SC:U),F,0,0 S:G$PINCHGC$0$0({1}SC:U),F,0,0 S:G$PINSEL$0$0({1}SC:U),F,0,0 S:G$LPOSCCONFIG$0$0({1}SC:U),F,0,0 S:G$LPOSCFREQ0$0$0({1}SC:U),F,0,0 S:G$LPOSCFREQ1$0$0({1}SC:U),F,0,0 S:G$LPOSCFREQ$0$0({2}SI:U),F,0,0 S:G$LPOSCKFILT0$0$0({1}SC:U),F,0,0 S:G$LPOSCKFILT1$0$0({1}SC:U),F,0,0 S:G$LPOSCKFILT$0$0({2}SI:U),F,0,0 S:G$LPOSCPER0$0$0({1}SC:U),F,0,0 S:G$LPOSCPER1$0$0({1}SC:U),F,0,0 S:G$LPOSCPER$0$0({2}SI:U),F,0,0 S:G$LPOSCREF0$0$0({1}SC:U),F,0,0 S:G$LPOSCREF1$0$0({1}SC:U),F,0,0 S:G$LPOSCREF$0$0({2}SI:U),F,0,0 S:G$LPXOSCGM$0$0({1}SC:U),F,0,0 S:G$MISCCTRL$0$0({1}SC:U),F,0,0 S:G$OSCCALIB$0$0({1}SC:U),F,0,0 S:G$OSCFORCERUN$0$0({1}SC:U),F,0,0 S:G$OSCREADY$0$0({1}SC:U),F,0,0 S:G$OSCRUN$0$0({1}SC:U),F,0,0 S:G$RADIOFDATAADDR0$0$0({1}SC:U),F,0,0 S:G$RADIOFDATAADDR1$0$0({1}SC:U),F,0,0 S:G$RADIOFDATAADDR$0$0({2}SI:U),F,0,0 S:G$RADIOFSTATADDR0$0$0({1}SC:U),F,0,0 S:G$RADIOFSTATADDR1$0$0({1}SC:U),F,0,0 S:G$RADIOFSTATADDR$0$0({2}SI:U),F,0,0 S:G$RADIOMUX$0$0({1}SC:U),F,0,0 S:G$SCRATCH0$0$0({1}SC:U),F,0,0 S:G$SCRATCH1$0$0({1}SC:U),F,0,0 S:G$SCRATCH2$0$0({1}SC:U),F,0,0 S:G$SCRATCH3$0$0({1}SC:U),F,0,0 S:G$SILICONREV$0$0({1}SC:U),F,0,0 S:G$XTALAMPL$0$0({1}SC:U),F,0,0 S:G$XTALOSC$0$0({1}SC:U),F,0,0 S:G$XTALREADY$0$0({1}SC:U),F,0,0 S:Fmain$flash_deviceid$0$0({6}DA6d,SC:U),F,0,0 S:Fmain$flash_calsector$0$0({31}STcalsector:S),F,0,0 S:G$radio_lcd_display$0$0({0}DA0d,SC:U),F,0,0 S:G$radio_not_found_lcd_display$0$0({0}DA0d,SC:U),F,0,0 S:G$wakeup_desc$0$0({8}STwtimer_desc:S),F,0,0 S:Lmain.transmit_packet$demo_packet_$1$366({18}DA18d,SC:U),F,0,0 S:G$ACC$0$0({1}SC:U),I,0,0 S:G$B$0$0({1}SC:U),I,0,0 S:G$DPH$0$0({1}SC:U),I,0,0 S:G$DPH1$0$0({1}SC:U),I,0,0 S:G$DPL$0$0({1}SC:U),I,0,0 S:G$DPL1$0$0({1}SC:U),I,0,0 S:G$DPTR0$0$0({2}SI:U),I,0,0 S:G$DPTR1$0$0({2}SI:U),I,0,0 S:G$DPS$0$0({1}SC:U),I,0,0 S:G$E2IE$0$0({1}SC:U),I,0,0 S:G$E2IP$0$0({1}SC:U),I,0,0 S:G$EIE$0$0({1}SC:U),I,0,0 S:G$EIP$0$0({1}SC:U),I,0,0 S:G$IE$0$0({1}SC:U),I,0,0 S:G$IP$0$0({1}SC:U),I,0,0 S:G$PCON$0$0({1}SC:U),I,0,0 S:G$PSW$0$0({1}SC:U),I,0,0 S:G$SP$0$0({1}SC:U),I,0,0 S:G$XPAGE$0$0({1}SC:U),I,0,0 S:G$_XPAGE$0$0({1}SC:U),I,0,0 S:G$ADCCH0CONFIG$0$0({1}SC:U),I,0,0 S:G$ADCCH1CONFIG$0$0({1}SC:U),I,0,0 S:G$ADCCH2CONFIG$0$0({1}SC:U),I,0,0 S:G$ADCCH3CONFIG$0$0({1}SC:U),I,0,0 S:G$ADCCLKSRC$0$0({1}SC:U),I,0,0 S:G$ADCCONV$0$0({1}SC:U),I,0,0 S:G$ANALOGCOMP$0$0({1}SC:U),I,0,0 S:G$CLKCON$0$0({1}SC:U),I,0,0 S:G$CLKSTAT$0$0({1}SC:U),I,0,0 S:G$CODECONFIG$0$0({1}SC:U),I,0,0 S:G$DBGLNKBUF$0$0({1}SC:U),I,0,0 S:G$DBGLNKSTAT$0$0({1}SC:U),I,0,0 S:G$DIRA$0$0({1}SC:U),I,0,0 S:G$DIRB$0$0({1}SC:U),I,0,0 S:G$DIRC$0$0({1}SC:U),I,0,0 S:G$DIRR$0$0({1}SC:U),I,0,0 S:G$PINA$0$0({1}SC:U),I,0,0 S:G$PINB$0$0({1}SC:U),I,0,0 S:G$PINC$0$0({1}SC:U),I,0,0 S:G$PINR$0$0({1}SC:U),I,0,0 S:G$PORTA$0$0({1}SC:U),I,0,0 S:G$PORTB$0$0({1}SC:U),I,0,0 S:G$PORTC$0$0({1}SC:U),I,0,0 S:G$PORTR$0$0({1}SC:U),I,0,0 S:G$IC0CAPT0$0$0({1}SC:U),I,0,0 S:G$IC0CAPT1$0$0({1}SC:U),I,0,0 S:G$IC0CAPT$0$0({2}SI:U),I,0,0 S:G$IC0MODE$0$0({1}SC:U),I,0,0 S:G$IC0STATUS$0$0({1}SC:U),I,0,0 S:G$IC1CAPT0$0$0({1}SC:U),I,0,0 S:G$IC1CAPT1$0$0({1}SC:U),I,0,0 S:G$IC1CAPT$0$0({2}SI:U),I,0,0 S:G$IC1MODE$0$0({1}SC:U),I,0,0 S:G$IC1STATUS$0$0({1}SC:U),I,0,0 S:G$NVADDR0$0$0({1}SC:U),I,0,0 S:G$NVADDR1$0$0({1}SC:U),I,0,0 S:G$NVADDR$0$0({2}SI:U),I,0,0 S:G$NVDATA0$0$0({1}SC:U),I,0,0 S:G$NVDATA1$0$0({1}SC:U),I,0,0 S:G$NVDATA$0$0({2}SI:U),I,0,0 S:G$NVKEY$0$0({1}SC:U),I,0,0 S:G$NVSTATUS$0$0({1}SC:U),I,0,0 S:G$OC0COMP0$0$0({1}SC:U),I,0,0 S:G$OC0COMP1$0$0({1}SC:U),I,0,0 S:G$OC0COMP$0$0({2}SI:U),I,0,0 S:G$OC0MODE$0$0({1}SC:U),I,0,0 S:G$OC0PIN$0$0({1}SC:U),I,0,0 S:G$OC0STATUS$0$0({1}SC:U),I,0,0 S:G$OC1COMP0$0$0({1}SC:U),I,0,0 S:G$OC1COMP1$0$0({1}SC:U),I,0,0 S:G$OC1COMP$0$0({2}SI:U),I,0,0 S:G$OC1MODE$0$0({1}SC:U),I,0,0 S:G$OC1PIN$0$0({1}SC:U),I,0,0 S:G$OC1STATUS$0$0({1}SC:U),I,0,0 S:G$RADIOACC$0$0({1}SC:U),I,0,0 S:G$RADIOADDR0$0$0({1}SC:U),I,0,0 S:G$RADIOADDR1$0$0({1}SC:U),I,0,0 S:G$RADIOADDR$0$0({2}SI:U),I,0,0 S:G$RADIODATA0$0$0({1}SC:U),I,0,0 S:G$RADIODATA1$0$0({1}SC:U),I,0,0 S:G$RADIODATA2$0$0({1}SC:U),I,0,0 S:G$RADIODATA3$0$0({1}SC:U),I,0,0 S:G$RADIODATA$0$0({4}SL:U),I,0,0 S:G$RADIOSTAT0$0$0({1}SC:U),I,0,0 S:G$RADIOSTAT1$0$0({1}SC:U),I,0,0 S:G$RADIOSTAT$0$0({2}SI:U),I,0,0 S:G$SPCLKSRC$0$0({1}SC:U),I,0,0 S:G$SPMODE$0$0({1}SC:U),I,0,0 S:G$SPSHREG$0$0({1}SC:U),I,0,0 S:G$SPSTATUS$0$0({1}SC:U),I,0,0 S:G$T0CLKSRC$0$0({1}SC:U),I,0,0 S:G$T0CNT0$0$0({1}SC:U),I,0,0 S:G$T0CNT1$0$0({1}SC:U),I,0,0 S:G$T0CNT$0$0({2}SI:U),I,0,0 S:G$T0MODE$0$0({1}SC:U),I,0,0 S:G$T0PERIOD0$0$0({1}SC:U),I,0,0 S:G$T0PERIOD1$0$0({1}SC:U),I,0,0 S:G$T0PERIOD$0$0({2}SI:U),I,0,0 S:G$T0STATUS$0$0({1}SC:U),I,0,0 S:G$T1CLKSRC$0$0({1}SC:U),I,0,0 S:G$T1CNT0$0$0({1}SC:U),I,0,0 S:G$T1CNT1$0$0({1}SC:U),I,0,0 S:G$T1CNT$0$0({2}SI:U),I,0,0 S:G$T1MODE$0$0({1}SC:U),I,0,0 S:G$T1PERIOD0$0$0({1}SC:U),I,0,0 S:G$T1PERIOD1$0$0({1}SC:U),I,0,0 S:G$T1PERIOD$0$0({2}SI:U),I,0,0 S:G$T1STATUS$0$0({1}SC:U),I,0,0 S:G$T2CLKSRC$0$0({1}SC:U),I,0,0 S:G$T2CNT0$0$0({1}SC:U),I,0,0 S:G$T2CNT1$0$0({1}SC:U),I,0,0 S:G$T2CNT$0$0({2}SI:U),I,0,0 S:G$T2MODE$0$0({1}SC:U),I,0,0 S:G$T2PERIOD0$0$0({1}SC:U),I,0,0 S:G$T2PERIOD1$0$0({1}SC:U),I,0,0 S:G$T2PERIOD$0$0({2}SI:U),I,0,0 S:G$T2STATUS$0$0({1}SC:U),I,0,0 S:G$U0CTRL$0$0({1}SC:U),I,0,0 S:G$U0MODE$0$0({1}SC:U),I,0,0 S:G$U0SHREG$0$0({1}SC:U),I,0,0 S:G$U0STATUS$0$0({1}SC:U),I,0,0 S:G$U1CTRL$0$0({1}SC:U),I,0,0 S:G$U1MODE$0$0({1}SC:U),I,0,0 S:G$U1SHREG$0$0({1}SC:U),I,0,0 S:G$U1STATUS$0$0({1}SC:U),I,0,0 S:G$WDTCFG$0$0({1}SC:U),I,0,0 S:G$WDTRESET$0$0({1}SC:U),I,0,0 S:G$WTCFGA$0$0({1}SC:U),I,0,0 S:G$WTCFGB$0$0({1}SC:U),I,0,0 S:G$WTCNTA0$0$0({1}SC:U),I,0,0 S:G$WTCNTA1$0$0({1}SC:U),I,0,0 S:G$WTCNTA$0$0({2}SI:U),I,0,0 S:G$WTCNTB0$0$0({1}SC:U),I,0,0 S:G$WTCNTB1$0$0({1}SC:U),I,0,0 S:G$WTCNTB$0$0({2}SI:U),I,0,0 S:G$WTCNTR1$0$0({1}SC:U),I,0,0 S:G$WTEVTA0$0$0({1}SC:U),I,0,0 S:G$WTEVTA1$0$0({1}SC:U),I,0,0 S:G$WTEVTA$0$0({2}SI:U),I,0,0 S:G$WTEVTB0$0$0({1}SC:U),I,0,0 S:G$WTEVTB1$0$0({1}SC:U),I,0,0 S:G$WTEVTB$0$0({2}SI:U),I,0,0 S:G$WTEVTC0$0$0({1}SC:U),I,0,0 S:G$WTEVTC1$0$0({1}SC:U),I,0,0 S:G$WTEVTC$0$0({2}SI:U),I,0,0 S:G$WTEVTD0$0$0({1}SC:U),I,0,0 S:G$WTEVTD1$0$0({1}SC:U),I,0,0 S:G$WTEVTD$0$0({2}SI:U),I,0,0 S:G$WTIRQEN$0$0({1}SC:U),I,0,0 S:G$WTSTAT$0$0({1}SC:U),I,0,0 S:G$ACC_0$0$0({1}SX:U),J,0,0 S:G$ACC_1$0$0({1}SX:U),J,0,0 S:G$ACC_2$0$0({1}SX:U),J,0,0 S:G$ACC_3$0$0({1}SX:U),J,0,0 S:G$ACC_4$0$0({1}SX:U),J,0,0 S:G$ACC_5$0$0({1}SX:U),J,0,0 S:G$ACC_6$0$0({1}SX:U),J,0,0 S:G$ACC_7$0$0({1}SX:U),J,0,0 S:G$B_0$0$0({1}SX:U),J,0,0 S:G$B_1$0$0({1}SX:U),J,0,0 S:G$B_2$0$0({1}SX:U),J,0,0 S:G$B_3$0$0({1}SX:U),J,0,0 S:G$B_4$0$0({1}SX:U),J,0,0 S:G$B_5$0$0({1}SX:U),J,0,0 S:G$B_6$0$0({1}SX:U),J,0,0 S:G$B_7$0$0({1}SX:U),J,0,0 S:G$E2IE_0$0$0({1}SX:U),J,0,0 S:G$E2IE_1$0$0({1}SX:U),J,0,0 S:G$E2IE_2$0$0({1}SX:U),J,0,0 S:G$E2IE_3$0$0({1}SX:U),J,0,0 S:G$E2IE_4$0$0({1}SX:U),J,0,0 S:G$E2IE_5$0$0({1}SX:U),J,0,0 S:G$E2IE_6$0$0({1}SX:U),J,0,0 S:G$E2IE_7$0$0({1}SX:U),J,0,0 S:G$E2IP_0$0$0({1}SX:U),J,0,0 S:G$E2IP_1$0$0({1}SX:U),J,0,0 S:G$E2IP_2$0$0({1}SX:U),J,0,0 S:G$E2IP_3$0$0({1}SX:U),J,0,0 S:G$E2IP_4$0$0({1}SX:U),J,0,0 S:G$E2IP_5$0$0({1}SX:U),J,0,0 S:G$E2IP_6$0$0({1}SX:U),J,0,0 S:G$E2IP_7$0$0({1}SX:U),J,0,0 S:G$EIE_0$0$0({1}SX:U),J,0,0 S:G$EIE_1$0$0({1}SX:U),J,0,0 S:G$EIE_2$0$0({1}SX:U),J,0,0 S:G$EIE_3$0$0({1}SX:U),J,0,0 S:G$EIE_4$0$0({1}SX:U),J,0,0 S:G$EIE_5$0$0({1}SX:U),J,0,0 S:G$EIE_6$0$0({1}SX:U),J,0,0 S:G$EIE_7$0$0({1}SX:U),J,0,0 S:G$EIP_0$0$0({1}SX:U),J,0,0 S:G$EIP_1$0$0({1}SX:U),J,0,0 S:G$EIP_2$0$0({1}SX:U),J,0,0 S:G$EIP_3$0$0({1}SX:U),J,0,0 S:G$EIP_4$0$0({1}SX:U),J,0,0 S:G$EIP_5$0$0({1}SX:U),J,0,0 S:G$EIP_6$0$0({1}SX:U),J,0,0 S:G$EIP_7$0$0({1}SX:U),J,0,0 S:G$IE_0$0$0({1}SX:U),J,0,0 S:G$IE_1$0$0({1}SX:U),J,0,0 S:G$IE_2$0$0({1}SX:U),J,0,0 S:G$IE_3$0$0({1}SX:U),J,0,0 S:G$IE_4$0$0({1}SX:U),J,0,0 S:G$IE_5$0$0({1}SX:U),J,0,0 S:G$IE_6$0$0({1}SX:U),J,0,0 S:G$IE_7$0$0({1}SX:U),J,0,0 S:G$EA$0$0({1}SX:U),J,0,0 S:G$IP_0$0$0({1}SX:U),J,0,0 S:G$IP_1$0$0({1}SX:U),J,0,0 S:G$IP_2$0$0({1}SX:U),J,0,0 S:G$IP_3$0$0({1}SX:U),J,0,0 S:G$IP_4$0$0({1}SX:U),J,0,0 S:G$IP_5$0$0({1}SX:U),J,0,0 S:G$IP_6$0$0({1}SX:U),J,0,0 S:G$IP_7$0$0({1}SX:U),J,0,0 S:G$P$0$0({1}SX:U),J,0,0 S:G$F1$0$0({1}SX:U),J,0,0 S:G$OV$0$0({1}SX:U),J,0,0 S:G$RS0$0$0({1}SX:U),J,0,0 S:G$RS1$0$0({1}SX:U),J,0,0 S:G$F0$0$0({1}SX:U),J,0,0 S:G$AC$0$0({1}SX:U),J,0,0 S:G$CY$0$0({1}SX:U),J,0,0 S:G$PINA_0$0$0({1}SX:U),J,0,0 S:G$PINA_1$0$0({1}SX:U),J,0,0 S:G$PINA_2$0$0({1}SX:U),J,0,0 S:G$PINA_3$0$0({1}SX:U),J,0,0 S:G$PINA_4$0$0({1}SX:U),J,0,0 S:G$PINA_5$0$0({1}SX:U),J,0,0 S:G$PINA_6$0$0({1}SX:U),J,0,0 S:G$PINA_7$0$0({1}SX:U),J,0,0 S:G$PINB_0$0$0({1}SX:U),J,0,0 S:G$PINB_1$0$0({1}SX:U),J,0,0 S:G$PINB_2$0$0({1}SX:U),J,0,0 S:G$PINB_3$0$0({1}SX:U),J,0,0 S:G$PINB_4$0$0({1}SX:U),J,0,0 S:G$PINB_5$0$0({1}SX:U),J,0,0 S:G$PINB_6$0$0({1}SX:U),J,0,0 S:G$PINB_7$0$0({1}SX:U),J,0,0 S:G$PINC_0$0$0({1}SX:U),J,0,0 S:G$PINC_1$0$0({1}SX:U),J,0,0 S:G$PINC_2$0$0({1}SX:U),J,0,0 S:G$PINC_3$0$0({1}SX:U),J,0,0 S:G$PINC_4$0$0({1}SX:U),J,0,0 S:G$PINC_5$0$0({1}SX:U),J,0,0 S:G$PINC_6$0$0({1}SX:U),J,0,0 S:G$PINC_7$0$0({1}SX:U),J,0,0 S:G$PORTA_0$0$0({1}SX:U),J,0,0 S:G$PORTA_1$0$0({1}SX:U),J,0,0 S:G$PORTA_2$0$0({1}SX:U),J,0,0 S:G$PORTA_3$0$0({1}SX:U),J,0,0 S:G$PORTA_4$0$0({1}SX:U),J,0,0 S:G$PORTA_5$0$0({1}SX:U),J,0,0 S:G$PORTA_6$0$0({1}SX:U),J,0,0 S:G$PORTA_7$0$0({1}SX:U),J,0,0 S:G$PORTB_0$0$0({1}SX:U),J,0,0 S:G$PORTB_1$0$0({1}SX:U),J,0,0 S:G$PORTB_2$0$0({1}SX:U),J,0,0 S:G$PORTB_3$0$0({1}SX:U),J,0,0 S:G$PORTB_4$0$0({1}SX:U),J,0,0 S:G$PORTB_5$0$0({1}SX:U),J,0,0 S:G$PORTB_6$0$0({1}SX:U),J,0,0 S:G$PORTB_7$0$0({1}SX:U),J,0,0 S:G$PORTC_0$0$0({1}SX:U),J,0,0 S:G$PORTC_1$0$0({1}SX:U),J,0,0 S:G$PORTC_2$0$0({1}SX:U),J,0,0 S:G$PORTC_3$0$0({1}SX:U),J,0,0 S:G$PORTC_4$0$0({1}SX:U),J,0,0 S:G$PORTC_5$0$0({1}SX:U),J,0,0 S:G$PORTC_6$0$0({1}SX:U),J,0,0 S:G$PORTC_7$0$0({1}SX:U),J,0,0 S:G$delay$0$0({2}DF,SV:S),C,0,0 S:G$random$0$0({2}DF,SI:U),C,0,0 S:G$signextend12$0$0({2}DF,SL:S),C,0,0 S:G$signextend16$0$0({2}DF,SL:S),C,0,0 S:G$signextend20$0$0({2}DF,SL:S),C,0,0 S:G$signextend24$0$0({2}DF,SL:S),C,0,0 S:G$hweight8$0$0({2}DF,SC:U),C,0,0 S:G$hweight16$0$0({2}DF,SC:U),C,0,0 S:G$hweight32$0$0({2}DF,SC:U),C,0,0 S:G$signedlimit16$0$0({2}DF,SI:S),C,0,0 S:G$checksignedlimit16$0$0({2}DF,SC:U),C,0,0 S:G$signedlimit32$0$0({2}DF,SL:S),C,0,0 S:G$checksignedlimit32$0$0({2}DF,SC:U),C,0,0 S:G$gray_encode8$0$0({2}DF,SC:U),C,0,0 S:G$gray_decode8$0$0({2}DF,SC:U),C,0,0 S:G$rev8$0$0({2}DF,SC:U),C,0,0 S:G$fmemset$0$0({2}DF,SV:S),C,0,0 S:G$fmemcpy$0$0({2}DF,SV:S),C,0,0 S:G$get_startcause$0$0({2}DF,SC:U),C,0,0 S:G$wtimer_standby$0$0({2}DF,SV:S),C,0,0 S:G$enter_standby$0$0({2}DF,SV:S),C,0,0 S:G$enter_deepsleep$0$0({2}DF,SV:S),C,0,0 S:G$enter_sleep$0$0({2}DF,SV:S),C,0,0 S:G$enter_sleep_cont$0$0({2}DF,SV:S),C,0,0 S:G$reset_cpu$0$0({2}DF,SV:S),C,0,0 S:G$enter_critical$0$0({2}DF,SC:U),C,0,0 S:G$exit_critical$0$0({2}DF,SV:S),C,0,0 S:G$reenter_critical$0$0({2}DF,SV:S),C,0,0 S:G$__enable_irq$0$0({2}DF,SV:S),C,0,0 S:G$__disable_irq$0$0({2}DF,SV:S),C,0,0 S:G$axradio_init$0$0({2}DF,SC:U),C,0,0 S:G$axradio_cansleep$0$0({2}DF,SC:U),C,0,0 S:G$axradio_set_mode$0$0({2}DF,SC:U),C,0,0 S:G$axradio_get_mode$0$0({2}DF,SC:U),C,0,0 S:G$axradio_set_channel$0$0({2}DF,SC:U),C,0,0 S:G$axradio_get_channel$0$0({2}DF,SC:U),C,0,0 S:G$axradio_get_pllrange$0$0({2}DF,SI:U),C,0,0 S:G$axradio_get_pllvcoi$0$0({2}DF,SC:U),C,0,0 S:G$axradio_set_local_address$0$0({2}DF,SV:S),C,0,0 S:G$axradio_get_local_address$0$0({2}DF,SV:S),C,0,0 S:G$axradio_set_default_remote_address$0$0({2}DF,SV:S),C,0,0 S:G$axradio_get_default_remote_address$0$0({2}DF,SV:S),C,0,0 S:G$axradio_transmit$0$0({2}DF,SC:U),C,0,0 S:G$axradio_set_freqoffset$0$0({2}DF,SC:U),C,0,0 S:G$axradio_get_freqoffset$0$0({2}DF,SL:S),C,0,0 S:G$axradio_conv_freq_tohz$0$0({2}DF,SL:S),C,0,0 S:G$axradio_conv_freq_fromhz$0$0({2}DF,SL:S),C,0,0 S:G$axradio_conv_timeinterval_totimer0$0$0({2}DF,SL:S),C,0,0 S:G$axradio_conv_time_totimer0$0$0({2}DF,SL:U),C,0,0 S:G$axradio_agc_freeze$0$0({2}DF,SC:U),C,0,0 S:G$axradio_agc_thaw$0$0({2}DF,SC:U),C,0,0 S:G$axradio_calibrate_lposc$0$0({2}DF,SV:S),C,0,0 S:G$axradio_check_fourfsk_modulation$0$0({2}DF,SC:U),C,0,0 S:G$axradio_get_transmitter_pa_type$0$0({2}DF,SC:U),C,0,0 S:G$axradio_setup_pincfg1$0$0({2}DF,SV:S),C,0,0 S:G$axradio_setup_pincfg2$0$0({2}DF,SV:S),C,0,0 S:G$axradio_commsleepexit$0$0({2}DF,SV:S),C,0,0 S:G$axradio_dbgpkt_enableIRQ$0$0({2}DF,SV:S),C,0,0 S:G$axradio_isr$0$0({2}DF,SV:S),C,0,0 S:G$radio_read16$0$0({2}DF,SI:U),C,0,0 S:G$radio_read24$0$0({2}DF,SL:U),C,0,0 S:G$radio_read32$0$0({2}DF,SL:U),C,0,0 S:G$radio_write16$0$0({2}DF,SV:S),C,0,0 S:G$radio_write24$0$0({2}DF,SV:S),C,0,0 S:G$radio_write32$0$0({2}DF,SV:S),C,0,0 S:G$ax5031_comminit$0$0({2}DF,SV:S),C,0,0 S:G$ax5031_commsleepexit$0$0({2}DF,SV:S),C,0,0 S:G$ax5031_reset$0$0({2}DF,SC:U),C,0,0 S:G$ax5031_rclk_enable$0$0({2}DF,SV:S),C,0,0 S:G$ax5031_rclk_disable$0$0({2}DF,SV:S),C,0,0 S:G$ax5031_readfifo$0$0({2}DF,SV:S),C,0,0 S:G$ax5031_writefifo$0$0({2}DF,SV:S),C,0,0 S:G$ax5042_comminit$0$0({2}DF,SV:S),C,0,0 S:G$ax5042_commsleepexit$0$0({2}DF,SV:S),C,0,0 S:G$ax5042_reset$0$0({2}DF,SC:U),C,0,0 S:G$ax5042_rclk_enable$0$0({2}DF,SV:S),C,0,0 S:G$ax5042_rclk_disable$0$0({2}DF,SV:S),C,0,0 S:G$ax5042_readfifo$0$0({2}DF,SV:S),C,0,0 S:G$ax5042_writefifo$0$0({2}DF,SV:S),C,0,0 S:G$ax5043_comminit$0$0({2}DF,SV:S),C,0,0 S:G$ax5043_commsleepexit$0$0({2}DF,SV:S),C,0,0 S:G$ax5043_reset$0$0({2}DF,SC:U),C,0,0 S:G$ax5043_enter_deepsleep$0$0({2}DF,SV:S),C,0,0 S:G$ax5043_wakeup_deepsleep$0$0({2}DF,SC:U),C,0,0 S:G$ax5043_rclk_enable$0$0({2}DF,SV:S),C,0,0 S:G$ax5043_rclk_disable$0$0({2}DF,SV:S),C,0,0 S:G$ax5043_rclk_wait_stable$0$0({2}DF,SV:S),C,0,0 S:G$ax5043_readfifo$0$0({2}DF,SV:S),C,0,0 S:G$ax5043_writefifo$0$0({2}DF,SV:S),C,0,0 S:G$ax5043_set_pwramp_pin$0$0({2}DF,SV:S),C,0,0 S:G$ax5043_get_pwramp_pin$0$0({2}DF,SC:U),C,0,0 S:G$ax5043_set_antsel_pin$0$0({2}DF,SV:S),C,0,0 S:G$ax5043_get_antsel_pin$0$0({2}DF,SC:U),C,0,0 S:G$ax5044_45_comminit$0$0({2}DF,SV:S),C,0,0 S:G$ax5044_45_commsleepexit$0$0({2}DF,SV:S),C,0,0 S:G$ax5044_45_reset$0$0({2}DF,SC:U),C,0,0 S:G$ax5044_45_enter_deepsleep$0$0({2}DF,SV:S),C,0,0 S:G$ax5044_45_wakeup_deepsleep$0$0({2}DF,SC:U),C,0,0 S:G$ax5044_45_rclk_enable$0$0({2}DF,SV:S),C,0,0 S:G$ax5044_45_rclk_disable$0$0({2}DF,SV:S),C,0,0 S:G$ax5044_45_rclk_wait_stable$0$0({2}DF,SV:S),C,0,0 S:G$ax5044_45_readfifo$0$0({2}DF,SV:S),C,0,0 S:G$ax5044_45_writefifo$0$0({2}DF,SV:S),C,0,0 S:G$ax5044_45_set_pwramp_pin$0$0({2}DF,SV:S),C,0,0 S:G$ax5044_45_get_pwramp_pin$0$0({2}DF,SC:U),C,0,0 S:G$ax5044_45_set_antsel_pin$0$0({2}DF,SV:S),C,0,0 S:G$ax5044_45_get_antsel_pin$0$0({2}DF,SC:U),C,0,0 S:G$ax5051_comminit$0$0({2}DF,SV:S),C,0,0 S:G$ax5051_commsleepexit$0$0({2}DF,SV:S),C,0,0 S:G$ax5051_reset$0$0({2}DF,SC:U),C,0,0 S:G$ax5051_rclk_enable$0$0({2}DF,SV:S),C,0,0 S:G$ax5051_rclk_disable$0$0({2}DF,SV:S),C,0,0 S:G$ax5051_readfifo$0$0({2}DF,SV:S),C,0,0 S:G$ax5051_writefifo$0$0({2}DF,SV:S),C,0,0 S:G$flash_unlock$0$0({2}DF,SV:S),C,0,0 S:G$flash_lock$0$0({2}DF,SV:S),C,0,0 S:G$flash_wait$0$0({2}DF,SC:S),C,0,0 S:G$flash_pageerase$0$0({2}DF,SC:S),C,0,0 S:G$flash_write$0$0({2}DF,SC:S),C,0,0 S:G$flash_read$0$0({2}DF,SI:U),C,0,0 S:G$flash_apply_calibration$0$0({2}DF,SC:U),C,0,0 S:G$wtimer0_setconfig$0$0({2}DF,SV:S),C,0,0 S:G$wtimer1_setconfig$0$0({2}DF,SV:S),C,0,0 S:G$wtimer_init$0$0({2}DF,SV:S),C,0,0 S:G$wtimer_init_deepsleep$0$0({2}DF,SV:S),C,0,0 S:G$wtimer_idle$0$0({2}DF,SC:U),C,0,0 S:G$wtimer_runcallbacks$0$0({2}DF,SC:U),C,0,0 S:G$wtimer0_curtime$0$0({2}DF,SL:U),C,0,0 S:G$wtimer1_curtime$0$0({2}DF,SL:U),C,0,0 S:G$wtimer0_addabsolute$0$0({2}DF,SV:S),C,0,0 S:G$wtimer1_addabsolute$0$0({2}DF,SV:S),C,0,0 S:G$wtimer0_addrelative$0$0({2}DF,SV:S),C,0,0 S:G$wtimer1_addrelative$0$0({2}DF,SV:S),C,0,0 S:G$wtimer_remove$0$0({2}DF,SC:U),C,0,0 S:G$wtimer0_remove$0$0({2}DF,SC:U),C,0,0 S:G$wtimer1_remove$0$0({2}DF,SC:U),C,0,0 S:G$wtimer_add_callback$0$0({2}DF,SV:S),C,0,0 S:G$wtimer_remove_callback$0$0({2}DF,SC:U),C,0,0 S:G$wtimer_cansleep$0$0({2}DF,SC:U),C,0,0 S:G$wtimer_irq$0$0({2}DF,SV:S),C,0,0 S:G$turn_off_xosc$0$0({2}DF,SV:S),C,0,0 S:G$turn_off_lpxosc$0$0({2}DF,SV:S),C,0,0 S:G$wtimer0_correctinterval$0$0({2}DF,SL:U),C,0,0 S:G$wtimer1_correctinterval$0$0({2}DF,SL:U),C,0,0 S:G$setup_xosc$0$0({2}DF,SV:S),C,0,0 S:G$setup_lpxosc$0$0({2}DF,SV:S),C,0,0 S:G$setup_osc_calibration$0$0({2}DF,SC:U),C,0,0 S:G$lcd2_irq$0$0({2}DF,SV:S),C,0,0 S:G$lcd2_poll$0$0({2}DF,SC:U),C,0,0 S:G$lcd2_txbufptr$0$0({2}DF,DX,SC:U),C,0,0 S:G$lcd2_txfreelinear$0$0({2}DF,SC:U),C,0,0 S:G$lcd2_txidle$0$0({2}DF,SC:U),C,0,0 S:G$lcd2_txfree$0$0({2}DF,SC:U),C,0,0 S:G$lcd2_txbuffersize$0$0({2}DF,SC:U),C,0,0 S:G$lcd2_txpokecmd$0$0({2}DF,SV:S),C,0,0 S:G$lcd2_txpoke$0$0({2}DF,SV:S),C,0,0 S:G$lcd2_txpokehex$0$0({2}DF,SV:S),C,0,0 S:G$lcd2_txadvance$0$0({2}DF,SV:S),C,0,0 S:G$lcd2_init$0$0({2}DF,SV:S),C,0,0 S:G$lcd2_portinit$0$0({2}DF,SV:S),C,0,0 S:G$lcd2_wait_txdone$0$0({2}DF,SV:S),C,0,0 S:G$lcd2_wait_txfree$0$0({2}DF,SV:S),C,0,0 S:G$lcd2_tx$0$0({2}DF,SV:S),C,0,0 S:G$lcd2_txcmdshort$0$0({2}DF,SV:S),C,0,0 S:G$lcd2_txcmdlong$0$0({2}DF,SV:S),C,0,0 S:G$lcd2_setpos$0$0({2}DF,SV:S),C,0,0 S:G$lcd2_cleardisplay$0$0({2}DF,SV:S),C,0,0 S:G$lcd2_clear$0$0({2}DF,SV:S),C,0,0 S:G$lcd2_writestr$0$0({2}DF,SV:S),C,0,0 S:G$lcd2_writenum16$0$0({2}DF,SC:U),C,0,0 S:G$lcd2_writehex16$0$0({2}DF,SC:U),C,0,0 S:G$lcd2_writenum32$0$0({2}DF,SC:U),C,0,0 S:G$lcd2_writehex32$0$0({2}DF,SC:U),C,0,0 S:G$dbglink_irq$0$0({2}DF,SV:S),C,0,0 S:G$dbglink_poll$0$0({2}DF,SC:U),C,0,0 S:G$dbglink_txbufptr$0$0({2}DF,DX,SC:U),C,0,0 S:G$dbglink_txfreelinear$0$0({2}DF,SC:U),C,0,0 S:G$dbglink_txidle$0$0({2}DF,SC:U),C,0,0 S:G$dbglink_txfree$0$0({2}DF,SC:U),C,0,0 S:G$dbglink_rxbufptr$0$0({2}DF,DX,SC:U),C,0,0 S:G$dbglink_rxcountlinear$0$0({2}DF,SC:U),C,0,0 S:G$dbglink_rxcount$0$0({2}DF,SC:U),C,0,0 S:G$dbglink_txbuffersize$0$0({2}DF,SC:U),C,0,0 S:G$dbglink_rxbuffersize$0$0({2}DF,SC:U),C,0,0 S:G$dbglink_rxpeek$0$0({2}DF,SC:U),C,0,0 S:G$dbglink_txpoke$0$0({2}DF,SV:S),C,0,0 S:G$dbglink_txpokehex$0$0({2}DF,SV:S),C,0,0 S:G$dbglink_rxadvance$0$0({2}DF,SV:S),C,0,0 S:G$dbglink_txadvance$0$0({2}DF,SV:S),C,0,0 S:G$dbglink_init$0$0({2}DF,SV:S),C,0,0 S:G$dbglink_wait_txdone$0$0({2}DF,SV:S),C,0,0 S:G$dbglink_wait_txfree$0$0({2}DF,SV:S),C,0,0 S:G$dbglink_wait_rxcount$0$0({2}DF,SV:S),C,0,0 S:G$dbglink_rx$0$0({2}DF,SC:U),C,0,0 S:G$dbglink_tx$0$0({2}DF,SV:S),C,0,0 S:G$dbglink_writestr$0$0({2}DF,SV:S),C,0,0 S:G$dbglink_writenum16$0$0({2}DF,SC:U),C,0,0 S:G$dbglink_writehex16$0$0({2}DF,SC:U),C,0,0 S:G$dbglink_writenum32$0$0({2}DF,SC:U),C,0,0 S:G$dbglink_writehex32$0$0({2}DF,SC:U),C,0,0 S:G$dbglink_writehexu16$0$0({2}DF,SV:S),C,0,0 S:G$dbglink_writehexu32$0$0({2}DF,SV:S),C,0,0 S:G$dbglink_writeu16$0$0({2}DF,SV:S),C,0,0 S:G$dbglink_writeu32$0$0({2}DF,SV:S),C,0,0 S:G$crc_ccitt_byte$0$0({2}DF,SI:U),C,0,0 S:G$crc_ccitt_msb_byte$0$0({2}DF,SI:U),C,0,0 S:G$crc_ccitt$0$0({2}DF,SI:U),C,0,0 S:G$crc_ccitt_msb$0$0({2}DF,SI:U),C,0,0 S:G$crc_crc16_byte$0$0({2}DF,SI:U),C,0,0 S:G$crc_crc16_msb_byte$0$0({2}DF,SI:U),C,0,0 S:G$crc_crc16$0$0({2}DF,SI:U),C,0,0 S:G$crc_crc16_msb$0$0({2}DF,SI:U),C,0,0 S:G$crc_crc16dnp_byte$0$0({2}DF,SI:U),C,0,0 S:G$crc_crc16dnp_msb_byte$0$0({2}DF,SI:U),C,0,0 S:G$crc_crc16dnp$0$0({2}DF,SI:U),C,0,0 S:G$crc_crc16dnp_msb$0$0({2}DF,SI:U),C,0,0 S:G$crc_crc32_byte$0$0({2}DF,SL:U),C,0,0 S:G$crc_crc32_msb_byte$0$0({2}DF,SL:U),C,0,0 S:G$crc_crc32$0$0({2}DF,SL:U),C,0,0 S:G$crc_crc32_msb$0$0({2}DF,SL:U),C,0,0 S:G$crc_crc8ccitt_byte$0$0({2}DF,SC:U),C,0,0 S:G$crc_crc8ccitt_msb_byte$0$0({2}DF,SC:U),C,0,0 S:G$crc_crc8ccitt$0$0({2}DF,SC:U),C,0,0 S:G$crc_crc8ccitt_msb$0$0({2}DF,SC:U),C,0,0 S:G$crc_crc8onewire_byte$0$0({2}DF,SC:U),C,0,0 S:G$crc_crc8onewire_msb_byte$0$0({2}DF,SC:U),C,0,0 S:G$crc_crc8onewire$0$0({2}DF,SC:U),C,0,0 S:G$crc_crc8onewire_msb$0$0({2}DF,SC:U),C,0,0 S:G$crc8_ccitt_byte$0$0({2}DF,SC:U),C,0,0 S:G$crc8_ccitt$0$0({2}DF,SC:U),C,0,0 S:G$crc8_onewire_byte$0$0({2}DF,SC:U),C,0,0 S:G$crc8_onewire$0$0({2}DF,SC:U),C,0,0 S:G$pn9_advance$0$0({2}DF,SI:U),C,0,0 S:G$pn9_advance_bit$0$0({2}DF,SI:U),C,0,0 S:G$pn9_advance_bits$0$0({2}DF,SI:U),C,0,0 S:G$pn9_advance_byte$0$0({2}DF,SI:U),C,0,0 S:G$pn9_buffer$0$0({2}DF,SI:U),C,0,0 S:G$pn15_advance$0$0({2}DF,SI:U),C,0,0 S:G$pn15_output$0$0({2}DF,SC:U),C,0,0 S:G$uart_timer0_baud$0$0({2}DF,SV:S),C,0,0 S:G$uart_timer1_baud$0$0({2}DF,SV:S),C,0,0 S:G$uart_timer2_baud$0$0({2}DF,SV:S),C,0,0 S:G$adc_measure_temperature$0$0({2}DF,SI:S),C,0,0 S:G$adc_calibrate_gain$0$0({2}DF,SV:S),C,0,0 S:G$adc_calibrate_temp$0$0({2}DF,SV:S),C,0,0 S:G$adc_calibrate$0$0({2}DF,SV:S),C,0,0 S:G$adc_uncalibrate$0$0({2}DF,SV:S),C,0,0 S:G$adc_singleended_offset_x01$0$0({2}DF,SI:U),C,0,0 S:G$adc_singleended_offset_x1$0$0({2}DF,SI:U),C,0,0 S:G$adc_singleended_offset_x10$0$0({2}DF,SI:U),C,0,0 S:G$bch3121_syndrome$0$0({2}DF,SI:U),C,0,0 S:G$bch3121_encode$0$0({2}DF,SL:U),C,0,0 S:G$bch3121_encode_parity$0$0({2}DF,SL:U),C,0,0 S:G$bch3121_decode$0$0({2}DF,SL:U),C,0,0 S:G$bch3121_decode_parity$0$0({2}DF,SL:U),C,0,0 S:G$uart0_irq$0$0({2}DF,SV:S),C,0,0 S:G$uart0_poll$0$0({2}DF,SC:U),C,0,0 S:G$uart0_txbufptr$0$0({2}DF,DX,SC:U),C,0,0 S:G$uart0_txfreelinear$0$0({2}DF,SC:U),C,0,0 S:G$uart0_txidle$0$0({2}DF,SC:U),C,0,0 S:G$uart0_txbusy$0$0({2}DF,SC:U),C,0,0 S:G$uart0_txfree$0$0({2}DF,SC:U),C,0,0 S:G$uart0_rxbufptr$0$0({2}DF,DX,SC:U),C,0,0 S:G$uart0_rxcountlinear$0$0({2}DF,SC:U),C,0,0 S:G$uart0_rxcount$0$0({2}DF,SC:U),C,0,0 S:G$uart0_txbuffersize$0$0({2}DF,SC:U),C,0,0 S:G$uart0_rxbuffersize$0$0({2}DF,SC:U),C,0,0 S:G$uart0_rxpeek$0$0({2}DF,SC:U),C,0,0 S:G$uart0_txpoke$0$0({2}DF,SV:S),C,0,0 S:G$uart0_txpokehex$0$0({2}DF,SV:S),C,0,0 S:G$uart0_rxadvance$0$0({2}DF,SV:S),C,0,0 S:G$uart0_txadvance$0$0({2}DF,SV:S),C,0,0 S:G$uart0_init$0$0({2}DF,SV:S),C,0,0 S:G$uart0_stop$0$0({2}DF,SV:S),C,0,0 S:G$uart0_wait_txdone$0$0({2}DF,SV:S),C,0,0 S:G$uart0_wait_txfree$0$0({2}DF,SV:S),C,0,0 S:G$uart0_wait_rxcount$0$0({2}DF,SV:S),C,0,0 S:G$uart0_rx$0$0({2}DF,SC:U),C,0,0 S:G$uart0_tx$0$0({2}DF,SV:S),C,0,0 S:G$uart0_writestr$0$0({2}DF,SV:S),C,0,0 S:G$uart0_writenum16$0$0({2}DF,SC:U),C,0,0 S:G$uart0_writehex16$0$0({2}DF,SC:U),C,0,0 S:G$uart0_writenum32$0$0({2}DF,SC:U),C,0,0 S:G$uart0_writehex32$0$0({2}DF,SC:U),C,0,0 S:G$uart0_writehexu16$0$0({2}DF,SV:S),C,0,0 S:G$uart0_writehexu32$0$0({2}DF,SV:S),C,0,0 S:G$uart0_writeu16$0$0({2}DF,SV:S),C,0,0 S:G$uart0_writeu32$0$0({2}DF,SV:S),C,0,0 S:G$uart1_irq$0$0({2}DF,SV:S),C,0,0 S:G$uart1_poll$0$0({2}DF,SC:U),C,0,0 S:G$uart1_txbufptr$0$0({2}DF,DX,SC:U),C,0,0 S:G$uart1_txfreelinear$0$0({2}DF,SC:U),C,0,0 S:G$uart1_txidle$0$0({2}DF,SC:U),C,0,0 S:G$uart1_txbusy$0$0({2}DF,SC:U),C,0,0 S:G$uart1_txfree$0$0({2}DF,SC:U),C,0,0 S:G$uart1_rxbufptr$0$0({2}DF,DX,SC:U),C,0,0 S:G$uart1_rxcountlinear$0$0({2}DF,SC:U),C,0,0 S:G$uart1_rxcount$0$0({2}DF,SC:U),C,0,0 S:G$uart1_txbuffersize$0$0({2}DF,SC:U),C,0,0 S:G$uart1_rxbuffersize$0$0({2}DF,SC:U),C,0,0 S:G$uart1_rxpeek$0$0({2}DF,SC:U),C,0,0 S:G$uart1_txpoke$0$0({2}DF,SV:S),C,0,0 S:G$uart1_txpokehex$0$0({2}DF,SV:S),C,0,0 S:G$uart1_rxadvance$0$0({2}DF,SV:S),C,0,0 S:G$uart1_txadvance$0$0({2}DF,SV:S),C,0,0 S:G$uart1_init$0$0({2}DF,SV:S),C,0,0 S:G$uart1_stop$0$0({2}DF,SV:S),C,0,0 S:G$uart1_wait_txdone$0$0({2}DF,SV:S),C,0,0 S:G$uart1_wait_txfree$0$0({2}DF,SV:S),C,0,0 S:G$uart1_wait_rxcount$0$0({2}DF,SV:S),C,0,0 S:G$uart1_rx$0$0({2}DF,SC:U),C,0,0 S:G$uart1_tx$0$0({2}DF,SV:S),C,0,0 S:G$uart1_writestr$0$0({2}DF,SV:S),C,0,0 S:G$uart1_writenum16$0$0({2}DF,SC:U),C,0,0 S:G$uart1_writehex16$0$0({2}DF,SC:U),C,0,0 S:G$uart1_writenum32$0$0({2}DF,SC:U),C,0,0 S:G$uart1_writehex32$0$0({2}DF,SC:U),C,0,0 S:G$uart1_writehexu16$0$0({2}DF,SV:S),C,0,0 S:G$uart1_writehexu32$0$0({2}DF,SV:S),C,0,0 S:G$uart1_writeu16$0$0({2}DF,SV:S),C,0,0 S:G$uart1_writeu32$0$0({2}DF,SV:S),C,0,0 S:G$com0_inituart0$0$0({2}DF,SV:S),C,0,0 S:G$com0_portinit$0$0({2}DF,SV:S),C,0,0 S:G$com0_init$0$0({2}DF,SV:S),C,0,0 S:G$com0_setpos$0$0({2}DF,SV:S),C,0,0 S:G$com0_writestr$0$0({2}DF,SV:S),C,0,0 S:G$com0_tx$0$0({2}DF,SV:S),C,0,0 S:G$com0_clear$0$0({2}DF,SV:S),C,0,0 S:G$memcpy$0$0({2}DF,DG,SV:S),C,0,0 S:G$memmove$0$0({2}DF,DG,SV:S),C,0,0 S:G$strcpy$0$0({2}DF,DG,SC:U),C,0,0 S:G$strncpy$0$0({2}DF,DG,SC:U),C,0,0 S:G$strcat$0$0({2}DF,DG,SC:U),C,0,0 S:G$strncat$0$0({2}DF,DG,SC:U),C,0,0 S:G$memcmp$0$0({2}DF,SI:S),C,0,0 S:G$strcmp$0$0({2}DF,SI:S),C,0,0 S:G$strncmp$0$0({2}DF,SI:S),C,0,0 S:G$strxfrm$0$0({2}DF,SI:U),C,0,0 S:G$memchr$0$0({2}DF,DG,SV:S),C,0,0 S:G$strchr$0$0({2}DF,DG,SC:U),C,0,0 S:G$strcspn$0$0({2}DF,SI:U),C,0,0 S:G$strpbrk$0$0({2}DF,DG,SC:U),C,0,0 S:G$strrchr$0$0({2}DF,DG,SC:U),C,0,0 S:G$strspn$0$0({2}DF,SI:U),C,0,0 S:G$strstr$0$0({2}DF,DG,SC:U),C,0,0 S:G$strtok$0$0({2}DF,DG,SC:U),C,0,0 S:G$memset$0$0({2}DF,DG,SV:S),C,0,0 S:G$strlen$0$0({2}DF,SI:U),C,0,0 S:G$display_received_packet$0$0({2}DF,SC:U),C,0,0 S:G$dbglink_received_packet$0$0({2}DF,SV:S),C,0,0 S:G$delay_ms$0$0({2}DF,SV:S),C,0,0 S:G$lcd2_display_radio_error$0$0({2}DF,SV:S),C,0,0 S:G$com0_display_radio_error$0$0({2}DF,SV:S),C,0,0 S:G$dbglink_display_radio_error$0$0({2}DF,SV:S),C,0,0 S:Fmain$pwrmgmt_irq$0$0({2}DF,SV:S),C,0,0 S:Fmain$transmit_packet$0$0({2}DF,SV:S),C,0,0 S:Fmain$display_transmit_packet$0$0({2}DF,SV:S),C,0,0 S:Fmain$wakeup_callback$0$0({2}DF,SV:S),C,0,0 S:G$_sdcc_external_startup$0$0({2}DF,SC:U),C,0,0 S:G$main$0$0({2}DF,SI:S),C,0,0 S:G$axradio_framing_maclen$0$0({1}SC:U),D,0,0 S:G$axradio_framing_addrlen$0$0({1}SC:U),D,0,0 S:G$remoteaddr$0$0({5}STaxradio_address:S),D,0,0 S:G$localaddr$0$0({10}STaxradio_address_mask:S),D,0,0 S:G$demo_packet$0$0({18}DA18d,SC:U),D,0,0 S:G$framing_insert_counter$0$0({1}SC:U),D,0,0 S:G$framing_counter_pos$0$0({1}SC:U),D,0,0 S:G$lpxosc_settlingtime$0$0({2}SI:U),D,0,0 S:G$crc_ccitt_table$0$0({512}DA256d,SI:U),D,0,0 S:G$crc_ccitt_msbtable$0$0({512}DA256d,SI:U),D,0,0 S:G$crc_crc16_table$0$0({512}DA256d,SI:U),D,0,0 S:G$crc_crc16_msbtable$0$0({512}DA256d,SI:U),D,0,0 S:G$crc_crc16dnp_table$0$0({512}DA256d,SI:U),D,0,0 S:G$crc_crc16dnp_msbtable$0$0({512}DA256d,SI:U),D,0,0 S:G$crc_crc32_table$0$0({1024}DA256d,SL:U),D,0,0 S:G$crc_crc32_msbtable$0$0({1024}DA256d,SL:U),D,0,0 S:G$crc_crc8ccitt_table$0$0({256}DA256d,SC:U),D,0,0 S:G$crc_crc8ccitt_msbtable$0$0({256}DA256d,SC:U),D,0,0 S:G$crc_crc8onewire_table$0$0({256}DA256d,SC:U),D,0,0 S:G$crc_crc8onewire_msbtable$0$0({256}DA256d,SC:U),D,0,0 S:G$pn9_table$0$0({512}DA512d,SC:U),D,0,0 S:G$pn15_adv_table$0$0({512}DA256d,SI:U),D,0,0 S:G$pn15_out_table$0$0({256}DA256d,SC:U),D,0,0 S:G$bch3121_syndrometable$0$0({2048}DA1024d,SI:U),D,0,0 S:Fmain$__str_0$0$0({7}DA7d,SC:S),D,0,0 S:Fmain$__str_1$0$0({5}DA5d,SC:S),D,0,0 S:Fmain$__str_2$0$0({7}DA7d,SC:S),D,0,0 S:Fmain$__str_3$0$0({7}DA7d,SC:S),D,0,0
reznikmm/matreshka
Ada
3,644
ads
------------------------------------------------------------------------------ -- -- -- Matreshka Project -- -- -- -- Open Document Toolkit -- -- -- -- Runtime Library Component -- -- -- ------------------------------------------------------------------------------ -- -- -- Copyright © 2014, Vadim Godunko <[email protected]> -- -- All rights reserved. -- -- -- -- Redistribution and use in source and binary forms, with or without -- -- modification, are permitted provided that the following conditions -- -- are met: -- -- -- -- * Redistributions of source code must retain the above copyright -- -- notice, this list of conditions and the following disclaimer. -- -- -- -- * Redistributions in binary form must reproduce the above copyright -- -- notice, this list of conditions and the following disclaimer in the -- -- documentation and/or other materials provided with the distribution. -- -- -- -- * Neither the name of the Vadim Godunko, IE nor the names of its -- -- contributors may be used to endorse or promote products derived from -- -- this software without specific prior written permission. -- -- -- -- THIS SOFTWARE IS PROVIDED BY THE COPYRIGHT HOLDERS AND CONTRIBUTORS -- -- "AS IS" AND ANY EXPRESS OR IMPLIED WARRANTIES, INCLUDING, BUT NOT -- -- LIMITED TO, THE IMPLIED WARRANTIES OF MERCHANTABILITY AND FITNESS FOR -- -- A PARTICULAR PURPOSE ARE DISCLAIMED. IN NO EVENT SHALL THE COPYRIGHT -- -- HOLDER OR CONTRIBUTORS BE LIABLE FOR ANY DIRECT, INDIRECT, INCIDENTAL, -- -- SPECIAL, EXEMPLARY, OR CONSEQUENTIAL DAMAGES (INCLUDING, BUT NOT LIMITED -- -- TO, PROCUREMENT OF SUBSTITUTE GOODS OR SERVICES; LOSS OF USE, DATA, OR -- -- PROFITS; OR BUSINESS INTERRUPTION) HOWEVER CAUSED AND ON ANY THEORY OF -- -- LIABILITY, WHETHER IN CONTRACT, STRICT LIABILITY, OR TORT (INCLUDING -- -- NEGLIGENCE OR OTHERWISE) ARISING IN ANY WAY OUT OF THE USE OF THIS -- -- SOFTWARE, EVEN IF ADVISED OF THE POSSIBILITY OF SUCH DAMAGE. -- -- -- ------------------------------------------------------------------------------ -- $Revision$ $Date$ ------------------------------------------------------------------------------ with XML.DOM.Elements; package ODF.DOM.Form_Text_Elements is pragma Preelaborate; type ODF_Form_Text is limited interface and XML.DOM.Elements.DOM_Element; type ODF_Form_Text_Access is access all ODF_Form_Text'Class with Storage_Size => 0; end ODF.DOM.Form_Text_Elements;
stcarrez/ada-util
Ada
5,383
adb
----------------------------------------------------------------------- -- util-nullables-tests - Test for nullables types -- Copyright (C) 2021 Stephane Carrez -- Written by Stephane Carrez ([email protected]) -- -- Licensed under the Apache License, Version 2.0 (the "License"); -- you may not use this file except in compliance with the License. -- You may obtain a copy of the License at -- -- http://www.apache.org/licenses/LICENSE-2.0 -- -- Unless required by applicable law or agreed to in writing, software -- distributed under the License is distributed on an "AS IS" BASIS, -- WITHOUT WARRANTIES OR CONDITIONS OF ANY KIND, either express or implied. -- See the License for the specific language governing permissions and -- limitations under the License. ----------------------------------------------------------------------- with Util.Test_Caller; with Util.Properties; package body Util.Nullables.Tests is use Util.Properties; -- used for "+" operator package Caller is new Util.Test_Caller (Test, "Nullables"); procedure Add_Tests (Suite : in Util.Tests.Access_Test_Suite) is begin Caller.Add_Test (Suite, "Test Util.Nullables.Driver.Execute", Test_Nullables'Access); end Add_Tests; procedure Test_Nullables (T : in out Test) is begin declare B1 : Nullable_Boolean := (Value => True, Is_Null => False); B2 : Nullable_Boolean := (Value => False, Is_Null => False); begin -- Check boolean T.Assert (B1 /= B2, "Bad Nullable_Boolean comparison"); T.Assert (B1 /= Null_Boolean, "Bad Nullable_Boolean comparison"); B1.Value := B2.Value; T.Assert (B1 = B2, "Bad Nullable_Boolean comparison"); B1.Value := not B1.Value; B1.Is_Null := True; T.Assert (B1 = Null_Boolean, "Bad Nullable_Boolean comparison"); B2.Is_Null := True; T.Assert (B2 = Null_Boolean, "Bad Nullable_Boolean comparison"); T.Assert (B2 = B1, "Bad Nullable_Boolean comparison"); end; declare I1 : Nullable_Integer := (Value => 0, Is_Null => False); I2 : Nullable_Integer := (Value => 12, Is_Null => False); begin -- Check integer T.Assert (I1 /= I2, "Bad Nullable_Integer comparison"); T.Assert (I1 /= Null_Integer, "Bad Nullable_Integer comparison"); I1.Value := I2.Value; T.Assert (I1 = I2, "Bad Nullable_Integer comparison"); I1.Value := 44; I1.Is_Null := True; T.Assert (I1 = Null_Integer, "Bad Nullable_Integer comparison"); I2.Is_Null := True; T.Assert (I2 = Null_Integer, "Bad Nullable_Integer comparison"); T.Assert (I2 = I1, "Bad Nullable_Integer comparison"); end; declare L1 : Nullable_Long := (Value => 0, Is_Null => False); L2 : Nullable_Long := (Value => 123, Is_Null => False); begin -- Check long T.Assert (L1 /= L2, "Bad Nullable_Long comparison"); T.Assert (L1 /= Null_Long, "Bad Nullable_Long comparison"); L1.Value := L2.Value; T.Assert (L1 = L2, "Bad Nullable_Long comparison"); L1.Value := 12; L1.Is_Null := True; T.Assert (L1 = Null_Long, "Bad Nullable_Long comparison"); L2.Is_Null := True; T.Assert (L2 = Null_Long, "Bad Nullable_Long comparison"); T.Assert (L2 = L1, "Bad Nullable_Long comparison"); end; declare S1 : Nullable_String := (Value => +("a"), Is_Null => False); S2 : Nullable_String := (Value => +("b"), Is_Null => False); begin -- Check string T.Assert (S1 /= S2, "Bad Nullable_String comparison"); T.Assert (S1 /= Null_String, "Bad Nullable_String comparison"); S1.Value := S2.Value; T.Assert (S1 = S2, "Bad Nullable_String comparison"); S1.Value := +("c"); S1.Is_Null := True; T.Assert (S1 = Null_String, "Bad Nullable_String comparison"); S2.Is_Null := True; T.Assert (S2 = Null_String, "Bad Nullable_String comparison"); T.Assert (S2 = S1, "Bad Nullable_String comparison"); end; declare TEST_TIME : constant Ada.Calendar.Time := Ada.Calendar.Time_Of (Year => 2000, Month => 11, Day => 17, Seconds => 0.0); T1 : Nullable_Time := (Value => TEST_TIME, Is_Null => False); T2 : Nullable_Time := (Value => Ada.Calendar.Clock, Is_Null => False); begin -- Check string T.Assert (T1 /= T2, "Bad Nullable_Time comparison"); T.Assert (T1 /= Null_Time, "Bad Nullable_Time comparison"); T1.Value := T2.Value; T.Assert (T1 = T2, "Bad Nullable_Time comparison"); T1.Value := TEST_TIME; T1.Is_Null := True; T.Assert (T1 = Null_Time, "Bad Nullable_Time comparison"); T2.Is_Null := True; T.Assert (T2 = Null_Time, "Bad Nullable_Time comparison"); T.Assert (T2 = T1, "Bad Nullable_Time comparison"); end; end Test_Nullables; end Util.Nullables.Tests;
reznikmm/matreshka
Ada
7,001
adb
------------------------------------------------------------------------------ -- -- -- Matreshka Project -- -- -- -- Open Document Toolkit -- -- -- -- Runtime Library Component -- -- -- ------------------------------------------------------------------------------ -- -- -- Copyright © 2014, Vadim Godunko <[email protected]> -- -- All rights reserved. -- -- -- -- Redistribution and use in source and binary forms, with or without -- -- modification, are permitted provided that the following conditions -- -- are met: -- -- -- -- * Redistributions of source code must retain the above copyright -- -- notice, this list of conditions and the following disclaimer. -- -- -- -- * Redistributions in binary form must reproduce the above copyright -- -- notice, this list of conditions and the following disclaimer in the -- -- documentation and/or other materials provided with the distribution. -- -- -- -- * Neither the name of the Vadim Godunko, IE nor the names of its -- -- contributors may be used to endorse or promote products derived from -- -- this software without specific prior written permission. -- -- -- -- THIS SOFTWARE IS PROVIDED BY THE COPYRIGHT HOLDERS AND CONTRIBUTORS -- -- "AS IS" AND ANY EXPRESS OR IMPLIED WARRANTIES, INCLUDING, BUT NOT -- -- LIMITED TO, THE IMPLIED WARRANTIES OF MERCHANTABILITY AND FITNESS FOR -- -- A PARTICULAR PURPOSE ARE DISCLAIMED. IN NO EVENT SHALL THE COPYRIGHT -- -- HOLDER OR CONTRIBUTORS BE LIABLE FOR ANY DIRECT, INDIRECT, INCIDENTAL, -- -- SPECIAL, EXEMPLARY, OR CONSEQUENTIAL DAMAGES (INCLUDING, BUT NOT LIMITED -- -- TO, PROCUREMENT OF SUBSTITUTE GOODS OR SERVICES; LOSS OF USE, DATA, OR -- -- PROFITS; OR BUSINESS INTERRUPTION) HOWEVER CAUSED AND ON ANY THEORY OF -- -- LIABILITY, WHETHER IN CONTRACT, STRICT LIABILITY, OR TORT (INCLUDING -- -- NEGLIGENCE OR OTHERWISE) ARISING IN ANY WAY OUT OF THE USE OF THIS -- -- SOFTWARE, EVEN IF ADVISED OF THE POSSIBILITY OF SUCH DAMAGE. -- -- -- ------------------------------------------------------------------------------ -- $Revision$ $Date$ ------------------------------------------------------------------------------ with Matreshka.DOM_Documents; with Matreshka.ODF_String_Constants; with ODF.DOM.Iterators; with ODF.DOM.Visitors; package body Matreshka.ODF_Table.Data_Pilot_Level_Elements is ------------ -- Create -- ------------ overriding function Create (Parameters : not null access Matreshka.DOM_Elements.Element_L2_Parameters) return Table_Data_Pilot_Level_Element_Node is begin return Self : Table_Data_Pilot_Level_Element_Node do Matreshka.ODF_Table.Constructors.Initialize (Self'Unchecked_Access, Parameters.Document, Matreshka.ODF_String_Constants.Table_Prefix); end return; end Create; ---------------- -- Enter_Node -- ---------------- overriding procedure Enter_Node (Self : not null access Table_Data_Pilot_Level_Element_Node; Visitor : in out XML.DOM.Visitors.Abstract_Visitor'Class; Control : in out XML.DOM.Visitors.Traverse_Control) is begin if Visitor in ODF.DOM.Visitors.Abstract_ODF_Visitor'Class then ODF.DOM.Visitors.Abstract_ODF_Visitor'Class (Visitor).Enter_Table_Data_Pilot_Level (ODF.DOM.Table_Data_Pilot_Level_Elements.ODF_Table_Data_Pilot_Level_Access (Self), Control); else Matreshka.DOM_Elements.Abstract_Element_Node (Self.all).Enter_Node (Visitor, Control); end if; end Enter_Node; -------------------- -- Get_Local_Name -- -------------------- overriding function Get_Local_Name (Self : not null access constant Table_Data_Pilot_Level_Element_Node) return League.Strings.Universal_String is pragma Unreferenced (Self); begin return Matreshka.ODF_String_Constants.Data_Pilot_Level_Element; end Get_Local_Name; ---------------- -- Leave_Node -- ---------------- overriding procedure Leave_Node (Self : not null access Table_Data_Pilot_Level_Element_Node; Visitor : in out XML.DOM.Visitors.Abstract_Visitor'Class; Control : in out XML.DOM.Visitors.Traverse_Control) is begin if Visitor in ODF.DOM.Visitors.Abstract_ODF_Visitor'Class then ODF.DOM.Visitors.Abstract_ODF_Visitor'Class (Visitor).Leave_Table_Data_Pilot_Level (ODF.DOM.Table_Data_Pilot_Level_Elements.ODF_Table_Data_Pilot_Level_Access (Self), Control); else Matreshka.DOM_Elements.Abstract_Element_Node (Self.all).Leave_Node (Visitor, Control); end if; end Leave_Node; ---------------- -- Visit_Node -- ---------------- overriding procedure Visit_Node (Self : not null access Table_Data_Pilot_Level_Element_Node; Iterator : in out XML.DOM.Visitors.Abstract_Iterator'Class; Visitor : in out XML.DOM.Visitors.Abstract_Visitor'Class; Control : in out XML.DOM.Visitors.Traverse_Control) is begin if Iterator in ODF.DOM.Iterators.Abstract_ODF_Iterator'Class then ODF.DOM.Iterators.Abstract_ODF_Iterator'Class (Iterator).Visit_Table_Data_Pilot_Level (Visitor, ODF.DOM.Table_Data_Pilot_Level_Elements.ODF_Table_Data_Pilot_Level_Access (Self), Control); else Matreshka.DOM_Elements.Abstract_Element_Node (Self.all).Visit_Node (Iterator, Visitor, Control); end if; end Visit_Node; begin Matreshka.DOM_Documents.Register_Element (Matreshka.ODF_String_Constants.Table_URI, Matreshka.ODF_String_Constants.Data_Pilot_Level_Element, Table_Data_Pilot_Level_Element_Node'Tag); end Matreshka.ODF_Table.Data_Pilot_Level_Elements;
reznikmm/matreshka
Ada
3,615
ads
------------------------------------------------------------------------------ -- -- -- 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.Reduce_Actions.Hash is new AMF.Elements.Generic_Hash (UML_Reduce_Action, UML_Reduce_Action_Access);
reznikmm/matreshka
Ada
10,956
adb
------------------------------------------------------------------------------ -- -- -- 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.Elements; with AMF.Internals.Element_Collections; with AMF.Internals.Helpers; with AMF.Internals.Tables.UML_Attributes; with AMF.Visitors.UML_Iterators; with AMF.Visitors.UML_Visitors; with League.Strings.Internals; with Matreshka.Internals.Strings; package body AMF.Internals.UML_Parameter_Sets is ------------------- -- Enter_Element -- ------------------- overriding procedure Enter_Element (Self : not null access constant UML_Parameter_Set_Proxy; Visitor : in out AMF.Visitors.Abstract_Visitor'Class; Control : in out AMF.Visitors.Traverse_Control) is begin if Visitor in AMF.Visitors.UML_Visitors.UML_Visitor'Class then AMF.Visitors.UML_Visitors.UML_Visitor'Class (Visitor).Enter_Parameter_Set (AMF.UML.Parameter_Sets.UML_Parameter_Set_Access (Self), Control); end if; end Enter_Element; ------------------- -- Leave_Element -- ------------------- overriding procedure Leave_Element (Self : not null access constant UML_Parameter_Set_Proxy; Visitor : in out AMF.Visitors.Abstract_Visitor'Class; Control : in out AMF.Visitors.Traverse_Control) is begin if Visitor in AMF.Visitors.UML_Visitors.UML_Visitor'Class then AMF.Visitors.UML_Visitors.UML_Visitor'Class (Visitor).Leave_Parameter_Set (AMF.UML.Parameter_Sets.UML_Parameter_Set_Access (Self), Control); end if; end Leave_Element; ------------------- -- Visit_Element -- ------------------- overriding procedure Visit_Element (Self : not null access constant UML_Parameter_Set_Proxy; Iterator : in out AMF.Visitors.Abstract_Iterator'Class; Visitor : in out AMF.Visitors.Abstract_Visitor'Class; Control : in out AMF.Visitors.Traverse_Control) is begin if Iterator in AMF.Visitors.UML_Iterators.UML_Iterator'Class then AMF.Visitors.UML_Iterators.UML_Iterator'Class (Iterator).Visit_Parameter_Set (Visitor, AMF.UML.Parameter_Sets.UML_Parameter_Set_Access (Self), Control); end if; end Visit_Element; ------------------- -- Get_Condition -- ------------------- overriding function Get_Condition (Self : not null access constant UML_Parameter_Set_Proxy) return AMF.UML.Constraints.Collections.Set_Of_UML_Constraint is begin return AMF.UML.Constraints.Collections.Wrap (AMF.Internals.Element_Collections.Wrap (AMF.Internals.Tables.UML_Attributes.Internal_Get_Condition (Self.Element))); end Get_Condition; ------------------- -- Get_Parameter -- ------------------- overriding function Get_Parameter (Self : not null access constant UML_Parameter_Set_Proxy) return AMF.UML.Parameters.Collections.Set_Of_UML_Parameter is begin return AMF.UML.Parameters.Collections.Wrap (AMF.Internals.Element_Collections.Wrap (AMF.Internals.Tables.UML_Attributes.Internal_Get_Parameter (Self.Element))); end Get_Parameter; --------------------------- -- Get_Client_Dependency -- --------------------------- overriding function Get_Client_Dependency (Self : not null access constant UML_Parameter_Set_Proxy) return AMF.UML.Dependencies.Collections.Set_Of_UML_Dependency is begin return AMF.UML.Dependencies.Collections.Wrap (AMF.Internals.Element_Collections.Wrap (AMF.Internals.Tables.UML_Attributes.Internal_Get_Client_Dependency (Self.Element))); end Get_Client_Dependency; ------------------------- -- Get_Name_Expression -- ------------------------- overriding function Get_Name_Expression (Self : not null access constant UML_Parameter_Set_Proxy) return AMF.UML.String_Expressions.UML_String_Expression_Access is begin return AMF.UML.String_Expressions.UML_String_Expression_Access (AMF.Internals.Helpers.To_Element (AMF.Internals.Tables.UML_Attributes.Internal_Get_Name_Expression (Self.Element))); end Get_Name_Expression; ------------------------- -- Set_Name_Expression -- ------------------------- overriding procedure Set_Name_Expression (Self : not null access UML_Parameter_Set_Proxy; To : AMF.UML.String_Expressions.UML_String_Expression_Access) is begin AMF.Internals.Tables.UML_Attributes.Internal_Set_Name_Expression (Self.Element, AMF.Internals.Helpers.To_Element (AMF.Elements.Element_Access (To))); end Set_Name_Expression; ------------------- -- Get_Namespace -- ------------------- overriding function Get_Namespace (Self : not null access constant UML_Parameter_Set_Proxy) return AMF.UML.Namespaces.UML_Namespace_Access is begin return AMF.UML.Namespaces.UML_Namespace_Access (AMF.Internals.Helpers.To_Element (AMF.Internals.Tables.UML_Attributes.Internal_Get_Namespace (Self.Element))); end Get_Namespace; ------------------------ -- Get_Qualified_Name -- ------------------------ overriding function Get_Qualified_Name (Self : not null access constant UML_Parameter_Set_Proxy) return AMF.Optional_String is begin declare use type Matreshka.Internals.Strings.Shared_String_Access; Aux : constant Matreshka.Internals.Strings.Shared_String_Access := AMF.Internals.Tables.UML_Attributes.Internal_Get_Qualified_Name (Self.Element); begin if Aux = null then return (Is_Empty => True); else return (False, League.Strings.Internals.Create (Aux)); end if; end; end Get_Qualified_Name; ------------------------- -- All_Owning_Packages -- ------------------------- overriding function All_Owning_Packages (Self : not null access constant UML_Parameter_Set_Proxy) return AMF.UML.Packages.Collections.Set_Of_UML_Package is begin -- Generated stub: replace with real body! pragma Compile_Time_Warning (Standard.True, "All_Owning_Packages unimplemented"); raise Program_Error with "Unimplemented procedure UML_Parameter_Set_Proxy.All_Owning_Packages"; return All_Owning_Packages (Self); end All_Owning_Packages; ----------------------------- -- Is_Distinguishable_From -- ----------------------------- overriding function Is_Distinguishable_From (Self : not null access constant UML_Parameter_Set_Proxy; N : AMF.UML.Named_Elements.UML_Named_Element_Access; Ns : AMF.UML.Namespaces.UML_Namespace_Access) return Boolean is begin -- Generated stub: replace with real body! pragma Compile_Time_Warning (Standard.True, "Is_Distinguishable_From unimplemented"); raise Program_Error with "Unimplemented procedure UML_Parameter_Set_Proxy.Is_Distinguishable_From"; return Is_Distinguishable_From (Self, N, Ns); end Is_Distinguishable_From; --------------- -- Namespace -- --------------- overriding function Namespace (Self : not null access constant UML_Parameter_Set_Proxy) return AMF.UML.Namespaces.UML_Namespace_Access is begin -- Generated stub: replace with real body! pragma Compile_Time_Warning (Standard.True, "Namespace unimplemented"); raise Program_Error with "Unimplemented procedure UML_Parameter_Set_Proxy.Namespace"; return Namespace (Self); end Namespace; end AMF.Internals.UML_Parameter_Sets;
0siris/carve
Ada
2,138
ads
-- -- (c) Copyright 1993,1994,1995,1996 Silicon Graphics, Inc. -- ALL RIGHTS RESERVED -- Permission to use, copy, modify, and distribute this software for -- any purpose and without fee is hereby granted, provided that the above -- copyright notice appear in all copies and that both the copyright notice -- and this permission notice appear in supporting documentation, and that -- the name of Silicon Graphics, Inc. not be used in advertising -- or publicity pertaining to distribution of the software without specific, -- written prior permission. -- -- THE MATERIAL EMBODIED ON THIS SOFTWARE IS PROVIDED TO YOU "AS-IS" -- AND WITHOUT WARRANTY OF ANY KIND, EXPRESS, IMPLIED OR OTHERWISE, -- INCLUDING WITHOUT LIMITATION, ANY WARRANTY OF MERCHANTABILITY OR -- FITNESS FOR A PARTICULAR PURPOSE. IN NO EVENT SHALL SILICON -- GRAPHICS, INC. BE LIABLE TO YOU OR ANYONE ELSE FOR ANY DIRECT, -- SPECIAL, INCIDENTAL, INDIRECT OR CONSEQUENTIAL DAMAGES OF ANY -- KIND, OR ANY DAMAGES WHATSOEVER, INCLUDING WITHOUT LIMITATION, -- LOSS OF PROFIT, LOSS OF USE, SAVINGS OR REVENUE, OR THE CLAIMS OF -- THIRD PARTIES, WHETHER OR NOT SILICON GRAPHICS, INC. HAS BEEN -- ADVISED OF THE POSSIBILITY OF SUCH LOSS, HOWEVER CAUSED AND ON -- ANY THEORY OF LIABILITY, ARISING OUT OF OR IN CONNECTION WITH THE -- POSSESSION, USE OR PERFORMANCE OF THIS SOFTWARE. -- -- US Government Users Restricted Rights -- Use, duplication, or disclosure by the Government is subject to -- restrictions set forth in FAR 52.227.19(c)(2) or subparagraph -- (c)(1)(ii) of the Rights in Technical Data and Computer Software -- clause at DFARS 252.227-7013 and/or in similar or successor -- clauses in the FAR or the DOD or NASA FAR Supplement. -- Unpublished-- rights reserved under the copyright laws of the -- United States. Contractor/manufacturer is Silicon Graphics, -- Inc., 2011 N. Shoreline Blvd., Mountain View, CA 94039-7311. -- -- OpenGL(TM) is a trademark of Silicon Graphics, Inc. -- package Texgen_Procs is procedure DoInit; procedure DoDisplay; procedure ReshapeCallback (w : Integer; h : Integer); end Texgen_Procs;
Heziode/lsystem-editor
Ada
2,257
adb
------------------------------------------------------------------------------- -- LSE -- L-System Editor -- Author: Heziode -- -- License: -- MIT License -- -- Copyright (c) 2018 Quentin Dauprat (Heziode) <[email protected]> -- -- Permission is hereby granted, free of charge, to any person obtaining a -- copy of this software and associated documentation files (the "Software"), -- to deal in the Software without restriction, including without limitation -- the rights to use, copy, modify, merge, publish, distribute, sublicense, -- and/or sell copies of the Software, and to permit persons to whom the -- Software is furnished to do so, subject to the following conditions: -- -- The above copyright notice and this permission notice shall be included in -- all copies or substantial portions of the Software. -- -- THE SOFTWARE IS PROVIDED "AS IS", WITHOUT WARRANTY OF ANY KIND, EXPRESS OR -- IMPLIED, INCLUDING BUT NOT LIMITED TO THE WARRANTIES OF MERCHANTABILITY, -- FITNESS FOR A PARTICULAR PURPOSE AND NONINFRINGEMENT. IN NO EVENT SHALL THE -- AUTHORS OR COPYRIGHT HOLDERS BE LIABLE FOR ANY CLAIM, DAMAGES OR OTHER -- LIABILITY, WHETHER IN AN ACTION OF CONTRACT, TORT OR OTHERWISE, ARISING -- FROM, OUT OF OR IN CONNECTION WITH THE SOFTWARE OR THE USE OR OTHER -- DEALINGS IN THE SOFTWARE. ------------------------------------------------------------------------------- with Ada.Strings; with Ada.Strings.Unbounded; package body LSE.Model.L_System.Error.Missing_Restore is function Initialize (Line, Column : Positive) return Instance is begin return Instance '(Error_Type.Missing_Restore, Line, Column); end Initialize; function Get_Error (This : Instance) return String is use Ada.Strings; use Ada.Strings.Unbounded; Str_Line : constant Unbounded_String := Trim (To_Unbounded_String (Positive'Image (This.Line)), Left); Str_Column : constant Unbounded_String := Trim (To_Unbounded_String (Positive'Image (This.Column)), Left); begin return "Missing save character for restore character defined at line " & To_String (Str_Line) & " column " & To_String (Str_Column); end Get_Error; end LSE.Model.L_System.Error.Missing_Restore;
reznikmm/matreshka
Ada
3,945
ads
------------------------------------------------------------------------------ -- -- -- Matreshka Project -- -- -- -- Open Document Toolkit -- -- -- -- Runtime Library Component -- -- -- ------------------------------------------------------------------------------ -- -- -- Copyright © 2014, Vadim Godunko <[email protected]> -- -- All rights reserved. -- -- -- -- Redistribution and use in source and binary forms, with or without -- -- modification, are permitted provided that the following conditions -- -- are met: -- -- -- -- * Redistributions of source code must retain the above copyright -- -- notice, this list of conditions and the following disclaimer. -- -- -- -- * Redistributions in binary form must reproduce the above copyright -- -- notice, this list of conditions and the following disclaimer in the -- -- documentation and/or other materials provided with the distribution. -- -- -- -- * Neither the name of the Vadim Godunko, IE nor the names of its -- -- contributors may be used to endorse or promote products derived from -- -- this software without specific prior written permission. -- -- -- -- THIS SOFTWARE IS PROVIDED BY THE COPYRIGHT HOLDERS AND CONTRIBUTORS -- -- "AS IS" AND ANY EXPRESS OR IMPLIED WARRANTIES, INCLUDING, BUT NOT -- -- LIMITED TO, THE IMPLIED WARRANTIES OF MERCHANTABILITY AND FITNESS FOR -- -- A PARTICULAR PURPOSE ARE DISCLAIMED. IN NO EVENT SHALL THE COPYRIGHT -- -- HOLDER OR CONTRIBUTORS BE LIABLE FOR ANY DIRECT, INDIRECT, INCIDENTAL, -- -- SPECIAL, EXEMPLARY, OR CONSEQUENTIAL DAMAGES (INCLUDING, BUT NOT LIMITED -- -- TO, PROCUREMENT OF SUBSTITUTE GOODS OR SERVICES; LOSS OF USE, DATA, OR -- -- PROFITS; OR BUSINESS INTERRUPTION) HOWEVER CAUSED AND ON ANY THEORY OF -- -- LIABILITY, WHETHER IN CONTRACT, STRICT LIABILITY, OR TORT (INCLUDING -- -- NEGLIGENCE OR OTHERWISE) ARISING IN ANY WAY OUT OF THE USE OF THIS -- -- SOFTWARE, EVEN IF ADVISED OF THE POSSIBILITY OF SUCH DAMAGE. -- -- -- ------------------------------------------------------------------------------ -- $Revision$ $Date$ ------------------------------------------------------------------------------ with ODF.DOM.Draw_End_Attributes; package Matreshka.ODF_Draw.End_Attributes is type Draw_End_Attribute_Node is new Matreshka.ODF_Draw.Abstract_Draw_Attribute_Node and ODF.DOM.Draw_End_Attributes.ODF_Draw_End_Attribute with null record; overriding function Create (Parameters : not null access Matreshka.DOM_Attributes.Attribute_L2_Parameters) return Draw_End_Attribute_Node; overriding function Get_Local_Name (Self : not null access constant Draw_End_Attribute_Node) return League.Strings.Universal_String; end Matreshka.ODF_Draw.End_Attributes;
AdaCore/Ada_Drivers_Library
Ada
5,772
adb
------------------------------------------------------------------------------ -- -- -- 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. -- -- -- ------------------------------------------------------------------------------ with Ada.Unchecked_Conversion; with STM32.Board; use STM32.Board; with STM32.Device; use STM32.Device; with STM32.GPIO; use STM32.GPIO; with STM32.SPI; use STM32.SPI; with HAL.SPI; package body Framebuffer_ILI9341 is LCD_SPI : SPI_Port renames SPI_5; LCD_WIDTH : constant := 240; LCD_HEIGHT : constant := 320; procedure LCD_SPI_Init; procedure LCD_Pins_Init; ------------------ -- LCD_SPI_Init -- ------------------ procedure LCD_SPI_Init is Conf : GPIO_Port_Configuration; SPI_Conf : SPI_Configuration; SPI_Pins : constant GPIO_Points := (SPI5_SCK, SPI5_MOSI, SPI5_MISO); begin Enable_Clock (SPI_Pins); Enable_Clock (LCD_SPI); Conf := (Mode => Mode_AF, AF => GPIO_AF_SPI5_5, AF_Speed => Speed_100MHz, AF_Output_Type => Push_Pull, Resistors => Floating); Configure_IO (SPI_Pins, Conf); Reset (LCD_SPI); if not Enabled (LCD_SPI) then SPI_Conf := (Direction => D2Lines_FullDuplex, Mode => Master, Data_Size => HAL.SPI.Data_Size_8b, Clock_Polarity => Low, Clock_Phase => P1Edge, Slave_Management => Software_Managed, Baud_Rate_Prescaler => BRP_32, First_Bit => MSB, CRC_Poly => 7); Configure (LCD_SPI, SPI_Conf); STM32.SPI.Enable (LCD_SPI); end if; end LCD_SPI_Init; ------------------- -- LCD_Pins_Init -- ------------------- procedure LCD_Pins_Init is begin Enable_Clock (GPIO_Points'(LCD_RESET, LCD_CSX, LCD_WRX_DCX)); Enable_Clock (LCD_PINS); Configure_IO (Points => (LCD_RESET, LCD_CSX, LCD_WRX_DCX), Config => (Speed => Speed_50MHz, Mode => Mode_Out, Output_Type => Push_Pull, Resistors => Floating)); Configure_IO (Points => LCD_PINS, Config => (AF_Speed => Speed_50MHz, AF => GPIO_AF_LTDC_14, Mode => Mode_AF, AF_Output_Type => Push_Pull, Resistors => Floating)); Configure_Alternate_Function (LCD_RGB_AF9, GPIO_AF_LTDC_9); -- Set LCD_CSX: Chip Unselect Set (LCD_CSX); end LCD_Pins_Init; ---------------- -- Initialize -- ---------------- procedure Initialize (Display : in out Frame_Buffer; Orientation : HAL.Framebuffer.Display_Orientation := Default; Mode : HAL.Framebuffer.Wait_Mode := Interrupt) is begin LCD_Pins_Init; LCD_SPI_Init; Display.Device.Initialize (ILI9341.RGB_Mode); Display.Initialize (Width => LCD_WIDTH, Height => LCD_HEIGHT, H_Sync => 10, H_Back_Porch => 20, H_Front_Porch => 10, V_Sync => 2, V_Back_Porch => 2, V_Front_Porch => 4, PLLSAI_N => 192, PLLSAI_R => 4, DivR => 8, Orientation => Orientation, Mode => Mode); end Initialize; end Framebuffer_ILI9341;
reznikmm/matreshka
Ada
25,731
adb
------------------------------------------------------------------------------ -- -- -- 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.Elements; with AMF.Internals.Element_Collections; with AMF.Internals.Helpers; with AMF.Internals.Tables.UML_Attributes; with AMF.Visitors.UML_Iterators; with AMF.Visitors.UML_Visitors; with League.Strings.Internals; with Matreshka.Internals.Strings; package body AMF.Internals.UML_Regions is ------------------- -- Enter_Element -- ------------------- overriding procedure Enter_Element (Self : not null access constant UML_Region_Proxy; Visitor : in out AMF.Visitors.Abstract_Visitor'Class; Control : in out AMF.Visitors.Traverse_Control) is begin if Visitor in AMF.Visitors.UML_Visitors.UML_Visitor'Class then AMF.Visitors.UML_Visitors.UML_Visitor'Class (Visitor).Enter_Region (AMF.UML.Regions.UML_Region_Access (Self), Control); end if; end Enter_Element; ------------------- -- Leave_Element -- ------------------- overriding procedure Leave_Element (Self : not null access constant UML_Region_Proxy; Visitor : in out AMF.Visitors.Abstract_Visitor'Class; Control : in out AMF.Visitors.Traverse_Control) is begin if Visitor in AMF.Visitors.UML_Visitors.UML_Visitor'Class then AMF.Visitors.UML_Visitors.UML_Visitor'Class (Visitor).Leave_Region (AMF.UML.Regions.UML_Region_Access (Self), Control); end if; end Leave_Element; ------------------- -- Visit_Element -- ------------------- overriding procedure Visit_Element (Self : not null access constant UML_Region_Proxy; Iterator : in out AMF.Visitors.Abstract_Iterator'Class; Visitor : in out AMF.Visitors.Abstract_Visitor'Class; Control : in out AMF.Visitors.Traverse_Control) is begin if Iterator in AMF.Visitors.UML_Iterators.UML_Iterator'Class then AMF.Visitors.UML_Iterators.UML_Iterator'Class (Iterator).Visit_Region (Visitor, AMF.UML.Regions.UML_Region_Access (Self), Control); end if; end Visit_Element; ------------------------- -- Get_Extended_Region -- ------------------------- overriding function Get_Extended_Region (Self : not null access constant UML_Region_Proxy) return AMF.UML.Regions.UML_Region_Access is begin return AMF.UML.Regions.UML_Region_Access (AMF.Internals.Helpers.To_Element (AMF.Internals.Tables.UML_Attributes.Internal_Get_Extended_Region (Self.Element))); end Get_Extended_Region; ------------------------- -- Set_Extended_Region -- ------------------------- overriding procedure Set_Extended_Region (Self : not null access UML_Region_Proxy; To : AMF.UML.Regions.UML_Region_Access) is begin AMF.Internals.Tables.UML_Attributes.Internal_Set_Extended_Region (Self.Element, AMF.Internals.Helpers.To_Element (AMF.Elements.Element_Access (To))); end Set_Extended_Region; ------------------------------ -- Get_Redefinition_Context -- ------------------------------ overriding function Get_Redefinition_Context (Self : not null access constant UML_Region_Proxy) return AMF.UML.Classifiers.UML_Classifier_Access is begin raise Program_Error; return Get_Redefinition_Context (Self); end Get_Redefinition_Context; --------------- -- Get_State -- --------------- overriding function Get_State (Self : not null access constant UML_Region_Proxy) return AMF.UML.States.UML_State_Access is begin return AMF.UML.States.UML_State_Access (AMF.Internals.Helpers.To_Element (AMF.Internals.Tables.UML_Attributes.Internal_Get_State (Self.Element))); end Get_State; --------------- -- Set_State -- --------------- overriding procedure Set_State (Self : not null access UML_Region_Proxy; To : AMF.UML.States.UML_State_Access) is begin AMF.Internals.Tables.UML_Attributes.Internal_Set_State (Self.Element, AMF.Internals.Helpers.To_Element (AMF.Elements.Element_Access (To))); end Set_State; ----------------------- -- Get_State_Machine -- ----------------------- overriding function Get_State_Machine (Self : not null access constant UML_Region_Proxy) return AMF.UML.State_Machines.UML_State_Machine_Access is begin return AMF.UML.State_Machines.UML_State_Machine_Access (AMF.Internals.Helpers.To_Element (AMF.Internals.Tables.UML_Attributes.Internal_Get_State_Machine (Self.Element))); end Get_State_Machine; ----------------------- -- Set_State_Machine -- ----------------------- overriding procedure Set_State_Machine (Self : not null access UML_Region_Proxy; To : AMF.UML.State_Machines.UML_State_Machine_Access) is begin AMF.Internals.Tables.UML_Attributes.Internal_Set_State_Machine (Self.Element, AMF.Internals.Helpers.To_Element (AMF.Elements.Element_Access (To))); end Set_State_Machine; ------------------- -- Get_Subvertex -- ------------------- overriding function Get_Subvertex (Self : not null access constant UML_Region_Proxy) return AMF.UML.Vertexs.Collections.Set_Of_UML_Vertex is begin return AMF.UML.Vertexs.Collections.Wrap (AMF.Internals.Element_Collections.Wrap (AMF.Internals.Tables.UML_Attributes.Internal_Get_Subvertex (Self.Element))); end Get_Subvertex; -------------------- -- Get_Transition -- -------------------- overriding function Get_Transition (Self : not null access constant UML_Region_Proxy) return AMF.UML.Transitions.Collections.Set_Of_UML_Transition is begin return AMF.UML.Transitions.Collections.Wrap (AMF.Internals.Element_Collections.Wrap (AMF.Internals.Tables.UML_Attributes.Internal_Get_Transition (Self.Element))); end Get_Transition; ------------------------ -- Get_Element_Import -- ------------------------ overriding function Get_Element_Import (Self : not null access constant UML_Region_Proxy) return AMF.UML.Element_Imports.Collections.Set_Of_UML_Element_Import is begin return AMF.UML.Element_Imports.Collections.Wrap (AMF.Internals.Element_Collections.Wrap (AMF.Internals.Tables.UML_Attributes.Internal_Get_Element_Import (Self.Element))); end Get_Element_Import; ------------------------- -- Get_Imported_Member -- ------------------------- overriding function Get_Imported_Member (Self : not null access constant UML_Region_Proxy) return AMF.UML.Packageable_Elements.Collections.Set_Of_UML_Packageable_Element is begin return AMF.UML.Packageable_Elements.Collections.Wrap (AMF.Internals.Element_Collections.Wrap (AMF.Internals.Tables.UML_Attributes.Internal_Get_Imported_Member (Self.Element))); end Get_Imported_Member; ---------------- -- Get_Member -- ---------------- overriding function Get_Member (Self : not null access constant UML_Region_Proxy) return AMF.UML.Named_Elements.Collections.Set_Of_UML_Named_Element is begin return AMF.UML.Named_Elements.Collections.Wrap (AMF.Internals.Element_Collections.Wrap (AMF.Internals.Tables.UML_Attributes.Internal_Get_Member (Self.Element))); end Get_Member; ---------------------- -- Get_Owned_Member -- ---------------------- overriding function Get_Owned_Member (Self : not null access constant UML_Region_Proxy) return AMF.UML.Named_Elements.Collections.Set_Of_UML_Named_Element is begin return AMF.UML.Named_Elements.Collections.Wrap (AMF.Internals.Element_Collections.Wrap (AMF.Internals.Tables.UML_Attributes.Internal_Get_Owned_Member (Self.Element))); end Get_Owned_Member; -------------------- -- Get_Owned_Rule -- -------------------- overriding function Get_Owned_Rule (Self : not null access constant UML_Region_Proxy) return AMF.UML.Constraints.Collections.Set_Of_UML_Constraint is begin return AMF.UML.Constraints.Collections.Wrap (AMF.Internals.Element_Collections.Wrap (AMF.Internals.Tables.UML_Attributes.Internal_Get_Owned_Rule (Self.Element))); end Get_Owned_Rule; ------------------------ -- Get_Package_Import -- ------------------------ overriding function Get_Package_Import (Self : not null access constant UML_Region_Proxy) return AMF.UML.Package_Imports.Collections.Set_Of_UML_Package_Import is begin return AMF.UML.Package_Imports.Collections.Wrap (AMF.Internals.Element_Collections.Wrap (AMF.Internals.Tables.UML_Attributes.Internal_Get_Package_Import (Self.Element))); end Get_Package_Import; --------------------------- -- Get_Client_Dependency -- --------------------------- overriding function Get_Client_Dependency (Self : not null access constant UML_Region_Proxy) return AMF.UML.Dependencies.Collections.Set_Of_UML_Dependency is begin return AMF.UML.Dependencies.Collections.Wrap (AMF.Internals.Element_Collections.Wrap (AMF.Internals.Tables.UML_Attributes.Internal_Get_Client_Dependency (Self.Element))); end Get_Client_Dependency; ------------------------- -- Get_Name_Expression -- ------------------------- overriding function Get_Name_Expression (Self : not null access constant UML_Region_Proxy) return AMF.UML.String_Expressions.UML_String_Expression_Access is begin return AMF.UML.String_Expressions.UML_String_Expression_Access (AMF.Internals.Helpers.To_Element (AMF.Internals.Tables.UML_Attributes.Internal_Get_Name_Expression (Self.Element))); end Get_Name_Expression; ------------------------- -- Set_Name_Expression -- ------------------------- overriding procedure Set_Name_Expression (Self : not null access UML_Region_Proxy; To : AMF.UML.String_Expressions.UML_String_Expression_Access) is begin AMF.Internals.Tables.UML_Attributes.Internal_Set_Name_Expression (Self.Element, AMF.Internals.Helpers.To_Element (AMF.Elements.Element_Access (To))); end Set_Name_Expression; ------------------- -- Get_Namespace -- ------------------- overriding function Get_Namespace (Self : not null access constant UML_Region_Proxy) return AMF.UML.Namespaces.UML_Namespace_Access is begin return AMF.UML.Namespaces.UML_Namespace_Access (AMF.Internals.Helpers.To_Element (AMF.Internals.Tables.UML_Attributes.Internal_Get_Namespace (Self.Element))); end Get_Namespace; ------------------------ -- Get_Qualified_Name -- ------------------------ overriding function Get_Qualified_Name (Self : not null access constant UML_Region_Proxy) return AMF.Optional_String is begin declare use type Matreshka.Internals.Strings.Shared_String_Access; Aux : constant Matreshka.Internals.Strings.Shared_String_Access := AMF.Internals.Tables.UML_Attributes.Internal_Get_Qualified_Name (Self.Element); begin if Aux = null then return (Is_Empty => True); else return (False, League.Strings.Internals.Create (Aux)); end if; end; end Get_Qualified_Name; ----------------- -- Get_Is_Leaf -- ----------------- overriding function Get_Is_Leaf (Self : not null access constant UML_Region_Proxy) return Boolean is begin return AMF.Internals.Tables.UML_Attributes.Internal_Get_Is_Leaf (Self.Element); end Get_Is_Leaf; ----------------- -- Set_Is_Leaf -- ----------------- overriding procedure Set_Is_Leaf (Self : not null access UML_Region_Proxy; To : Boolean) is begin AMF.Internals.Tables.UML_Attributes.Internal_Set_Is_Leaf (Self.Element, To); end Set_Is_Leaf; --------------------------- -- Get_Redefined_Element -- --------------------------- overriding function Get_Redefined_Element (Self : not null access constant UML_Region_Proxy) return AMF.UML.Redefinable_Elements.Collections.Set_Of_UML_Redefinable_Element is begin return AMF.UML.Redefinable_Elements.Collections.Wrap (AMF.Internals.Element_Collections.Wrap (AMF.Internals.Tables.UML_Attributes.Internal_Get_Redefined_Element (Self.Element))); end Get_Redefined_Element; ------------------------------ -- Get_Redefinition_Context -- ------------------------------ overriding function Get_Redefinition_Context (Self : not null access constant UML_Region_Proxy) return AMF.UML.Classifiers.Collections.Set_Of_UML_Classifier is begin return AMF.UML.Classifiers.Collections.Wrap (AMF.Internals.Element_Collections.Wrap (AMF.Internals.Tables.UML_Attributes.Internal_Get_Redefinition_Context (Self.Element))); end Get_Redefinition_Context; -------------------- -- Belongs_To_PSM -- -------------------- overriding function Belongs_To_PSM (Self : not null access constant UML_Region_Proxy) return Boolean is begin -- Generated stub: replace with real body! pragma Compile_Time_Warning (Standard.True, "Belongs_To_PSM unimplemented"); raise Program_Error with "Unimplemented procedure UML_Region_Proxy.Belongs_To_PSM"; return Belongs_To_PSM (Self); end Belongs_To_PSM; ------------------------------ -- Containing_State_Machine -- ------------------------------ overriding function Containing_State_Machine (Self : not null access constant UML_Region_Proxy) return AMF.UML.State_Machines.UML_State_Machine_Access is begin -- Generated stub: replace with real body! pragma Compile_Time_Warning (Standard.True, "Containing_State_Machine unimplemented"); raise Program_Error with "Unimplemented procedure UML_Region_Proxy.Containing_State_Machine"; return Containing_State_Machine (Self); end Containing_State_Machine; ------------------------ -- Is_Consistent_With -- ------------------------ overriding function Is_Consistent_With (Self : not null access constant UML_Region_Proxy; Redefinee : AMF.UML.Redefinable_Elements.UML_Redefinable_Element_Access) return Boolean is begin -- Generated stub: replace with real body! pragma Compile_Time_Warning (Standard.True, "Is_Consistent_With unimplemented"); raise Program_Error with "Unimplemented procedure UML_Region_Proxy.Is_Consistent_With"; return Is_Consistent_With (Self, Redefinee); end Is_Consistent_With; ----------------------------------- -- Is_Redefinition_Context_Valid -- ----------------------------------- overriding function Is_Redefinition_Context_Valid (Self : not null access constant UML_Region_Proxy; Redefined : AMF.UML.Regions.UML_Region_Access) return Boolean is begin -- Generated stub: replace with real body! pragma Compile_Time_Warning (Standard.True, "Is_Redefinition_Context_Valid unimplemented"); raise Program_Error with "Unimplemented procedure UML_Region_Proxy.Is_Redefinition_Context_Valid"; return Is_Redefinition_Context_Valid (Self, Redefined); end Is_Redefinition_Context_Valid; -------------------------- -- Redefinition_Context -- -------------------------- overriding function Redefinition_Context (Self : not null access constant UML_Region_Proxy) return AMF.UML.Classifiers.UML_Classifier_Access is begin -- Generated stub: replace with real body! pragma Compile_Time_Warning (Standard.True, "Redefinition_Context unimplemented"); raise Program_Error with "Unimplemented procedure UML_Region_Proxy.Redefinition_Context"; return Redefinition_Context (Self); end Redefinition_Context; ------------------------ -- Exclude_Collisions -- ------------------------ overriding function Exclude_Collisions (Self : not null access constant UML_Region_Proxy; Imps : AMF.UML.Packageable_Elements.Collections.Set_Of_UML_Packageable_Element) return AMF.UML.Packageable_Elements.Collections.Set_Of_UML_Packageable_Element is begin -- Generated stub: replace with real body! pragma Compile_Time_Warning (Standard.True, "Exclude_Collisions unimplemented"); raise Program_Error with "Unimplemented procedure UML_Region_Proxy.Exclude_Collisions"; return Exclude_Collisions (Self, Imps); end Exclude_Collisions; ------------------------- -- Get_Names_Of_Member -- ------------------------- overriding function Get_Names_Of_Member (Self : not null access constant UML_Region_Proxy; Element : AMF.UML.Named_Elements.UML_Named_Element_Access) return AMF.String_Collections.Set_Of_String is begin -- Generated stub: replace with real body! pragma Compile_Time_Warning (Standard.True, "Get_Names_Of_Member unimplemented"); raise Program_Error with "Unimplemented procedure UML_Region_Proxy.Get_Names_Of_Member"; return Get_Names_Of_Member (Self, Element); end Get_Names_Of_Member; -------------------- -- Import_Members -- -------------------- overriding function Import_Members (Self : not null access constant UML_Region_Proxy; Imps : AMF.UML.Packageable_Elements.Collections.Set_Of_UML_Packageable_Element) return AMF.UML.Packageable_Elements.Collections.Set_Of_UML_Packageable_Element is begin -- Generated stub: replace with real body! pragma Compile_Time_Warning (Standard.True, "Import_Members unimplemented"); raise Program_Error with "Unimplemented procedure UML_Region_Proxy.Import_Members"; return Import_Members (Self, Imps); end Import_Members; --------------------- -- Imported_Member -- --------------------- overriding function Imported_Member (Self : not null access constant UML_Region_Proxy) return AMF.UML.Packageable_Elements.Collections.Set_Of_UML_Packageable_Element is begin -- Generated stub: replace with real body! pragma Compile_Time_Warning (Standard.True, "Imported_Member unimplemented"); raise Program_Error with "Unimplemented procedure UML_Region_Proxy.Imported_Member"; return Imported_Member (Self); end Imported_Member; --------------------------------- -- Members_Are_Distinguishable -- --------------------------------- overriding function Members_Are_Distinguishable (Self : not null access constant UML_Region_Proxy) return Boolean is begin -- Generated stub: replace with real body! pragma Compile_Time_Warning (Standard.True, "Members_Are_Distinguishable unimplemented"); raise Program_Error with "Unimplemented procedure UML_Region_Proxy.Members_Are_Distinguishable"; return Members_Are_Distinguishable (Self); end Members_Are_Distinguishable; ------------------ -- Owned_Member -- ------------------ overriding function Owned_Member (Self : not null access constant UML_Region_Proxy) return AMF.UML.Named_Elements.Collections.Set_Of_UML_Named_Element is begin -- Generated stub: replace with real body! pragma Compile_Time_Warning (Standard.True, "Owned_Member unimplemented"); raise Program_Error with "Unimplemented procedure UML_Region_Proxy.Owned_Member"; return Owned_Member (Self); end Owned_Member; ------------------------- -- All_Owning_Packages -- ------------------------- overriding function All_Owning_Packages (Self : not null access constant UML_Region_Proxy) return AMF.UML.Packages.Collections.Set_Of_UML_Package is begin -- Generated stub: replace with real body! pragma Compile_Time_Warning (Standard.True, "All_Owning_Packages unimplemented"); raise Program_Error with "Unimplemented procedure UML_Region_Proxy.All_Owning_Packages"; return All_Owning_Packages (Self); end All_Owning_Packages; ----------------------------- -- Is_Distinguishable_From -- ----------------------------- overriding function Is_Distinguishable_From (Self : not null access constant UML_Region_Proxy; N : AMF.UML.Named_Elements.UML_Named_Element_Access; Ns : AMF.UML.Namespaces.UML_Namespace_Access) return Boolean is begin -- Generated stub: replace with real body! pragma Compile_Time_Warning (Standard.True, "Is_Distinguishable_From unimplemented"); raise Program_Error with "Unimplemented procedure UML_Region_Proxy.Is_Distinguishable_From"; return Is_Distinguishable_From (Self, N, Ns); end Is_Distinguishable_From; --------------- -- Namespace -- --------------- overriding function Namespace (Self : not null access constant UML_Region_Proxy) return AMF.UML.Namespaces.UML_Namespace_Access is begin -- Generated stub: replace with real body! pragma Compile_Time_Warning (Standard.True, "Namespace unimplemented"); raise Program_Error with "Unimplemented procedure UML_Region_Proxy.Namespace"; return Namespace (Self); end Namespace; ----------------------------------- -- Is_Redefinition_Context_Valid -- ----------------------------------- overriding function Is_Redefinition_Context_Valid (Self : not null access constant UML_Region_Proxy; Redefined : AMF.UML.Redefinable_Elements.UML_Redefinable_Element_Access) return Boolean is begin -- Generated stub: replace with real body! pragma Compile_Time_Warning (Standard.True, "Is_Redefinition_Context_Valid unimplemented"); raise Program_Error with "Unimplemented procedure UML_Region_Proxy.Is_Redefinition_Context_Valid"; return Is_Redefinition_Context_Valid (Self, Redefined); end Is_Redefinition_Context_Valid; end AMF.Internals.UML_Regions;
rui314/mold
Ada
20,401
adb
---------------------------------------------------------------- -- ZLib for Ada thick binding. -- -- -- -- Copyright (C) 2002-2004 Dmitriy Anisimkov -- -- -- -- Open source license information is in the zlib.ads file. -- ---------------------------------------------------------------- -- $Id: zlib.adb,v 1.31 2004/09/06 06:53:19 vagul Exp $ with Ada.Exceptions; with Ada.Unchecked_Conversion; with Ada.Unchecked_Deallocation; with Interfaces.C.Strings; with ZLib.Thin; package body ZLib is use type Thin.Int; type Z_Stream is new Thin.Z_Stream; type Return_Code_Enum is (OK, STREAM_END, NEED_DICT, ERRNO, STREAM_ERROR, DATA_ERROR, MEM_ERROR, BUF_ERROR, VERSION_ERROR); type Flate_Step_Function is access function (Strm : in Thin.Z_Streamp; Flush : in Thin.Int) return Thin.Int; pragma Convention (C, Flate_Step_Function); type Flate_End_Function is access function (Ctrm : in Thin.Z_Streamp) return Thin.Int; pragma Convention (C, Flate_End_Function); type Flate_Type is record Step : Flate_Step_Function; Done : Flate_End_Function; end record; subtype Footer_Array is Stream_Element_Array (1 .. 8); Simple_GZip_Header : constant Stream_Element_Array (1 .. 10) := (16#1f#, 16#8b#, -- Magic header 16#08#, -- Z_DEFLATED 16#00#, -- Flags 16#00#, 16#00#, 16#00#, 16#00#, -- Time 16#00#, -- XFlags 16#03# -- OS code ); -- The simplest gzip header is not for informational, but just for -- gzip format compatibility. -- Note that some code below is using assumption -- Simple_GZip_Header'Last > Footer_Array'Last, so do not make -- Simple_GZip_Header'Last <= Footer_Array'Last. Return_Code : constant array (Thin.Int range <>) of Return_Code_Enum := (0 => OK, 1 => STREAM_END, 2 => NEED_DICT, -1 => ERRNO, -2 => STREAM_ERROR, -3 => DATA_ERROR, -4 => MEM_ERROR, -5 => BUF_ERROR, -6 => VERSION_ERROR); Flate : constant array (Boolean) of Flate_Type := (True => (Step => Thin.Deflate'Access, Done => Thin.DeflateEnd'Access), False => (Step => Thin.Inflate'Access, Done => Thin.InflateEnd'Access)); Flush_Finish : constant array (Boolean) of Flush_Mode := (True => Finish, False => No_Flush); procedure Raise_Error (Stream : in Z_Stream); pragma Inline (Raise_Error); procedure Raise_Error (Message : in String); pragma Inline (Raise_Error); procedure Check_Error (Stream : in Z_Stream; Code : in Thin.Int); procedure Free is new Ada.Unchecked_Deallocation (Z_Stream, Z_Stream_Access); function To_Thin_Access is new Ada.Unchecked_Conversion (Z_Stream_Access, Thin.Z_Streamp); procedure Translate_GZip (Filter : in out Filter_Type; In_Data : in Ada.Streams.Stream_Element_Array; In_Last : out Ada.Streams.Stream_Element_Offset; Out_Data : out Ada.Streams.Stream_Element_Array; Out_Last : out Ada.Streams.Stream_Element_Offset; Flush : in Flush_Mode); -- Separate translate routine for make gzip header. procedure Translate_Auto (Filter : in out Filter_Type; In_Data : in Ada.Streams.Stream_Element_Array; In_Last : out Ada.Streams.Stream_Element_Offset; Out_Data : out Ada.Streams.Stream_Element_Array; Out_Last : out Ada.Streams.Stream_Element_Offset; Flush : in Flush_Mode); -- translate routine without additional headers. ----------------- -- Check_Error -- ----------------- procedure Check_Error (Stream : in Z_Stream; Code : in Thin.Int) is use type Thin.Int; begin if Code /= Thin.Z_OK then Raise_Error (Return_Code_Enum'Image (Return_Code (Code)) & ": " & Last_Error_Message (Stream)); end if; end Check_Error; ----------- -- Close -- ----------- procedure Close (Filter : in out Filter_Type; Ignore_Error : in Boolean := False) is Code : Thin.Int; begin if not Ignore_Error and then not Is_Open (Filter) then raise Status_Error; end if; Code := Flate (Filter.Compression).Done (To_Thin_Access (Filter.Strm)); if Ignore_Error or else Code = Thin.Z_OK then Free (Filter.Strm); else declare Error_Message : constant String := Last_Error_Message (Filter.Strm.all); begin Free (Filter.Strm); Ada.Exceptions.Raise_Exception (ZLib_Error'Identity, Return_Code_Enum'Image (Return_Code (Code)) & ": " & Error_Message); end; end if; end Close; ----------- -- CRC32 -- ----------- function CRC32 (CRC : in Unsigned_32; Data : in Ada.Streams.Stream_Element_Array) return Unsigned_32 is use Thin; begin return Unsigned_32 (crc32 (ULong (CRC), Data'Address, Data'Length)); end CRC32; procedure CRC32 (CRC : in out Unsigned_32; Data : in Ada.Streams.Stream_Element_Array) is begin CRC := CRC32 (CRC, Data); end CRC32; ------------------ -- Deflate_Init -- ------------------ procedure Deflate_Init (Filter : in out Filter_Type; Level : in Compression_Level := Default_Compression; Strategy : in Strategy_Type := Default_Strategy; Method : in Compression_Method := Deflated; Window_Bits : in Window_Bits_Type := Default_Window_Bits; Memory_Level : in Memory_Level_Type := Default_Memory_Level; Header : in Header_Type := Default) is use type Thin.Int; Win_Bits : Thin.Int := Thin.Int (Window_Bits); begin if Is_Open (Filter) then raise Status_Error; end if; -- We allow ZLib to make header only in case of default header type. -- Otherwise we would either do header by ourselves, or do not do -- header at all. if Header = None or else Header = GZip then Win_Bits := -Win_Bits; end if; -- For the GZip CRC calculation and make headers. if Header = GZip then Filter.CRC := 0; Filter.Offset := Simple_GZip_Header'First; else Filter.Offset := Simple_GZip_Header'Last + 1; end if; Filter.Strm := new Z_Stream; Filter.Compression := True; Filter.Stream_End := False; Filter.Header := Header; if Thin.Deflate_Init (To_Thin_Access (Filter.Strm), Level => Thin.Int (Level), method => Thin.Int (Method), windowBits => Win_Bits, memLevel => Thin.Int (Memory_Level), strategy => Thin.Int (Strategy)) /= Thin.Z_OK then Raise_Error (Filter.Strm.all); end if; end Deflate_Init; ----------- -- Flush -- ----------- procedure Flush (Filter : in out Filter_Type; Out_Data : out Ada.Streams.Stream_Element_Array; Out_Last : out Ada.Streams.Stream_Element_Offset; Flush : in Flush_Mode) is No_Data : Stream_Element_Array := (1 .. 0 => 0); Last : Stream_Element_Offset; begin Translate (Filter, No_Data, Last, Out_Data, Out_Last, Flush); end Flush; ----------------------- -- Generic_Translate -- ----------------------- procedure Generic_Translate (Filter : in out ZLib.Filter_Type; In_Buffer_Size : in Integer := Default_Buffer_Size; Out_Buffer_Size : in Integer := Default_Buffer_Size) is In_Buffer : Stream_Element_Array (1 .. Stream_Element_Offset (In_Buffer_Size)); Out_Buffer : Stream_Element_Array (1 .. Stream_Element_Offset (Out_Buffer_Size)); Last : Stream_Element_Offset; In_Last : Stream_Element_Offset; In_First : Stream_Element_Offset; Out_Last : Stream_Element_Offset; begin Main : loop Data_In (In_Buffer, Last); In_First := In_Buffer'First; loop Translate (Filter => Filter, In_Data => In_Buffer (In_First .. Last), In_Last => In_Last, Out_Data => Out_Buffer, Out_Last => Out_Last, Flush => Flush_Finish (Last < In_Buffer'First)); if Out_Buffer'First <= Out_Last then Data_Out (Out_Buffer (Out_Buffer'First .. Out_Last)); end if; exit Main when Stream_End (Filter); -- The end of in buffer. exit when In_Last = Last; In_First := In_Last + 1; end loop; end loop Main; end Generic_Translate; ------------------ -- Inflate_Init -- ------------------ procedure Inflate_Init (Filter : in out Filter_Type; Window_Bits : in Window_Bits_Type := Default_Window_Bits; Header : in Header_Type := Default) is use type Thin.Int; Win_Bits : Thin.Int := Thin.Int (Window_Bits); procedure Check_Version; -- Check the latest header types compatibility. procedure Check_Version is begin if Version <= "1.1.4" then Raise_Error ("Inflate header type " & Header_Type'Image (Header) & " incompatible with ZLib version " & Version); end if; end Check_Version; begin if Is_Open (Filter) then raise Status_Error; end if; case Header is when None => Check_Version; -- Inflate data without headers determined -- by negative Win_Bits. Win_Bits := -Win_Bits; when GZip => Check_Version; -- Inflate gzip data defined by flag 16. Win_Bits := Win_Bits + 16; when Auto => Check_Version; -- Inflate with automatic detection -- of gzip or native header defined by flag 32. Win_Bits := Win_Bits + 32; when Default => null; end case; Filter.Strm := new Z_Stream; Filter.Compression := False; Filter.Stream_End := False; Filter.Header := Header; if Thin.Inflate_Init (To_Thin_Access (Filter.Strm), Win_Bits) /= Thin.Z_OK then Raise_Error (Filter.Strm.all); end if; end Inflate_Init; ------------- -- Is_Open -- ------------- function Is_Open (Filter : in Filter_Type) return Boolean is begin return Filter.Strm /= null; end Is_Open; ----------------- -- Raise_Error -- ----------------- procedure Raise_Error (Message : in String) is begin Ada.Exceptions.Raise_Exception (ZLib_Error'Identity, Message); end Raise_Error; procedure Raise_Error (Stream : in Z_Stream) is begin Raise_Error (Last_Error_Message (Stream)); end Raise_Error; ---------- -- Read -- ---------- procedure Read (Filter : in out Filter_Type; Item : out Ada.Streams.Stream_Element_Array; Last : out Ada.Streams.Stream_Element_Offset; Flush : in Flush_Mode := No_Flush) is In_Last : Stream_Element_Offset; Item_First : Ada.Streams.Stream_Element_Offset := Item'First; V_Flush : Flush_Mode := Flush; begin pragma Assert (Rest_First in Buffer'First .. Buffer'Last + 1); pragma Assert (Rest_Last in Buffer'First - 1 .. Buffer'Last); loop if Rest_Last = Buffer'First - 1 then V_Flush := Finish; elsif Rest_First > Rest_Last then Read (Buffer, Rest_Last); Rest_First := Buffer'First; if Rest_Last < Buffer'First then V_Flush := Finish; end if; end if; Translate (Filter => Filter, In_Data => Buffer (Rest_First .. Rest_Last), In_Last => In_Last, Out_Data => Item (Item_First .. Item'Last), Out_Last => Last, Flush => V_Flush); Rest_First := In_Last + 1; exit when Stream_End (Filter) or else Last = Item'Last or else (Last >= Item'First and then Allow_Read_Some); Item_First := Last + 1; end loop; end Read; ---------------- -- Stream_End -- ---------------- function Stream_End (Filter : in Filter_Type) return Boolean is begin if Filter.Header = GZip and Filter.Compression then return Filter.Stream_End and then Filter.Offset = Footer_Array'Last + 1; else return Filter.Stream_End; end if; end Stream_End; -------------- -- Total_In -- -------------- function Total_In (Filter : in Filter_Type) return Count is begin return Count (Thin.Total_In (To_Thin_Access (Filter.Strm).all)); end Total_In; --------------- -- Total_Out -- --------------- function Total_Out (Filter : in Filter_Type) return Count is begin return Count (Thin.Total_Out (To_Thin_Access (Filter.Strm).all)); end Total_Out; --------------- -- Translate -- --------------- procedure Translate (Filter : in out Filter_Type; In_Data : in Ada.Streams.Stream_Element_Array; In_Last : out Ada.Streams.Stream_Element_Offset; Out_Data : out Ada.Streams.Stream_Element_Array; Out_Last : out Ada.Streams.Stream_Element_Offset; Flush : in Flush_Mode) is begin if Filter.Header = GZip and then Filter.Compression then Translate_GZip (Filter => Filter, In_Data => In_Data, In_Last => In_Last, Out_Data => Out_Data, Out_Last => Out_Last, Flush => Flush); else Translate_Auto (Filter => Filter, In_Data => In_Data, In_Last => In_Last, Out_Data => Out_Data, Out_Last => Out_Last, Flush => Flush); end if; end Translate; -------------------- -- Translate_Auto -- -------------------- procedure Translate_Auto (Filter : in out Filter_Type; In_Data : in Ada.Streams.Stream_Element_Array; In_Last : out Ada.Streams.Stream_Element_Offset; Out_Data : out Ada.Streams.Stream_Element_Array; Out_Last : out Ada.Streams.Stream_Element_Offset; Flush : in Flush_Mode) is use type Thin.Int; Code : Thin.Int; begin if not Is_Open (Filter) then raise Status_Error; end if; if Out_Data'Length = 0 and then In_Data'Length = 0 then raise Constraint_Error; end if; Set_Out (Filter.Strm.all, Out_Data'Address, Out_Data'Length); Set_In (Filter.Strm.all, In_Data'Address, In_Data'Length); Code := Flate (Filter.Compression).Step (To_Thin_Access (Filter.Strm), Thin.Int (Flush)); if Code = Thin.Z_STREAM_END then Filter.Stream_End := True; else Check_Error (Filter.Strm.all, Code); end if; In_Last := In_Data'Last - Stream_Element_Offset (Avail_In (Filter.Strm.all)); Out_Last := Out_Data'Last - Stream_Element_Offset (Avail_Out (Filter.Strm.all)); end Translate_Auto; -------------------- -- Translate_GZip -- -------------------- procedure Translate_GZip (Filter : in out Filter_Type; In_Data : in Ada.Streams.Stream_Element_Array; In_Last : out Ada.Streams.Stream_Element_Offset; Out_Data : out Ada.Streams.Stream_Element_Array; Out_Last : out Ada.Streams.Stream_Element_Offset; Flush : in Flush_Mode) is Out_First : Stream_Element_Offset; procedure Add_Data (Data : in Stream_Element_Array); -- Add data to stream from the Filter.Offset till necessary, -- used for add gzip headr/footer. procedure Put_32 (Item : in out Stream_Element_Array; Data : in Unsigned_32); pragma Inline (Put_32); -------------- -- Add_Data -- -------------- procedure Add_Data (Data : in Stream_Element_Array) is Data_First : Stream_Element_Offset renames Filter.Offset; Data_Last : Stream_Element_Offset; Data_Len : Stream_Element_Offset; -- -1 Out_Len : Stream_Element_Offset; -- -1 begin Out_First := Out_Last + 1; if Data_First > Data'Last then return; end if; Data_Len := Data'Last - Data_First; Out_Len := Out_Data'Last - Out_First; if Data_Len <= Out_Len then Out_Last := Out_First + Data_Len; Data_Last := Data'Last; else Out_Last := Out_Data'Last; Data_Last := Data_First + Out_Len; end if; Out_Data (Out_First .. Out_Last) := Data (Data_First .. Data_Last); Data_First := Data_Last + 1; Out_First := Out_Last + 1; end Add_Data; ------------ -- Put_32 -- ------------ procedure Put_32 (Item : in out Stream_Element_Array; Data : in Unsigned_32) is D : Unsigned_32 := Data; begin for J in Item'First .. Item'First + 3 loop Item (J) := Stream_Element (D and 16#FF#); D := Shift_Right (D, 8); end loop; end Put_32; begin Out_Last := Out_Data'First - 1; if not Filter.Stream_End then Add_Data (Simple_GZip_Header); Translate_Auto (Filter => Filter, In_Data => In_Data, In_Last => In_Last, Out_Data => Out_Data (Out_First .. Out_Data'Last), Out_Last => Out_Last, Flush => Flush); CRC32 (Filter.CRC, In_Data (In_Data'First .. In_Last)); end if; if Filter.Stream_End and then Out_Last <= Out_Data'Last then -- This detection method would work only when -- Simple_GZip_Header'Last > Footer_Array'Last if Filter.Offset = Simple_GZip_Header'Last + 1 then Filter.Offset := Footer_Array'First; end if; declare Footer : Footer_Array; begin Put_32 (Footer, Filter.CRC); Put_32 (Footer (Footer'First + 4 .. Footer'Last), Unsigned_32 (Total_In (Filter))); Add_Data (Footer); end; end if; end Translate_GZip; ------------- -- Version -- ------------- function Version return String is begin return Interfaces.C.Strings.Value (Thin.zlibVersion); end Version; ----------- -- Write -- ----------- procedure Write (Filter : in out Filter_Type; Item : in Ada.Streams.Stream_Element_Array; Flush : in Flush_Mode := No_Flush) is Buffer : Stream_Element_Array (1 .. Buffer_Size); In_Last : Stream_Element_Offset; Out_Last : Stream_Element_Offset; In_First : Stream_Element_Offset := Item'First; begin if Item'Length = 0 and Flush = No_Flush then return; end if; loop Translate (Filter => Filter, In_Data => Item (In_First .. Item'Last), In_Last => In_Last, Out_Data => Buffer, Out_Last => Out_Last, Flush => Flush); if Out_Last >= Buffer'First then Write (Buffer (1 .. Out_Last)); end if; exit when In_Last = Item'Last or Stream_End (Filter); In_First := In_Last + 1; end loop; end Write; end ZLib;
kontena/ruby-packer
Ada
3,452
ads
------------------------------------------------------------------------------ -- -- -- GNAT ncurses Binding -- -- -- -- Terminal_Interface.Curses.Forms.Field_Types.IntField -- -- -- -- S P E C -- -- -- ------------------------------------------------------------------------------ -- Copyright (c) 1998-2003,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.12 $ -- Binding Version 01.00 ------------------------------------------------------------------------------ package Terminal_Interface.Curses.Forms.Field_Types.IntField is pragma Preelaborate (Terminal_Interface.Curses.Forms.Field_Types.IntField); type Integer_Field is new Field_Type with record Precision : Natural; Lower_Limit : Integer; Upper_Limit : Integer; end record; procedure Set_Field_Type (Fld : Field; Typ : Integer_Field); pragma Inline (Set_Field_Type); end Terminal_Interface.Curses.Forms.Field_Types.IntField;
ekoeppen/STM32_Generic_Ada_Drivers
Ada
25,953
ads
-- This spec has been automatically generated from STM32F072x.svd pragma Restrictions (No_Elaboration_Code); pragma Ada_2012; pragma Style_Checks (Off); with System; package STM32_SVD.RTC is pragma Preelaborate; --------------- -- Registers -- --------------- subtype TR_SU_Field is STM32_SVD.UInt4; subtype TR_ST_Field is STM32_SVD.UInt3; subtype TR_MNU_Field is STM32_SVD.UInt4; subtype TR_MNT_Field is STM32_SVD.UInt3; subtype TR_HU_Field is STM32_SVD.UInt4; subtype TR_HT_Field is STM32_SVD.UInt2; subtype TR_PM_Field is STM32_SVD.Bit; -- time register type TR_Register is record -- Second units in BCD format SU : TR_SU_Field := 16#0#; -- Second tens in BCD format ST : TR_ST_Field := 16#0#; -- unspecified Reserved_7_7 : STM32_SVD.Bit := 16#0#; -- Minute units in BCD format MNU : TR_MNU_Field := 16#0#; -- Minute tens in BCD format MNT : TR_MNT_Field := 16#0#; -- unspecified Reserved_15_15 : STM32_SVD.Bit := 16#0#; -- Hour units in BCD format HU : TR_HU_Field := 16#0#; -- Hour tens in BCD format HT : TR_HT_Field := 16#0#; -- AM/PM notation PM : TR_PM_Field := 16#0#; -- unspecified Reserved_23_31 : STM32_SVD.UInt9 := 16#0#; end record with Volatile_Full_Access, Size => 32, Bit_Order => System.Low_Order_First; for TR_Register use record SU at 0 range 0 .. 3; ST at 0 range 4 .. 6; Reserved_7_7 at 0 range 7 .. 7; MNU at 0 range 8 .. 11; MNT at 0 range 12 .. 14; Reserved_15_15 at 0 range 15 .. 15; HU at 0 range 16 .. 19; HT at 0 range 20 .. 21; PM at 0 range 22 .. 22; Reserved_23_31 at 0 range 23 .. 31; end record; subtype DR_DU_Field is STM32_SVD.UInt4; subtype DR_DT_Field is STM32_SVD.UInt2; subtype DR_MU_Field is STM32_SVD.UInt4; subtype DR_MT_Field is STM32_SVD.Bit; subtype DR_WDU_Field is STM32_SVD.UInt3; subtype DR_YU_Field is STM32_SVD.UInt4; subtype DR_YT_Field is STM32_SVD.UInt4; -- date register type DR_Register is record -- Date units in BCD format DU : DR_DU_Field := 16#1#; -- Date tens in BCD format DT : DR_DT_Field := 16#0#; -- unspecified Reserved_6_7 : STM32_SVD.UInt2 := 16#0#; -- Month units in BCD format MU : DR_MU_Field := 16#1#; -- Month tens in BCD format MT : DR_MT_Field := 16#0#; -- Week day units WDU : DR_WDU_Field := 16#1#; -- Year units in BCD format YU : DR_YU_Field := 16#0#; -- Year tens in BCD format YT : DR_YT_Field := 16#0#; -- unspecified Reserved_24_31 : STM32_SVD.Byte := 16#0#; end record with Volatile_Full_Access, Size => 32, Bit_Order => System.Low_Order_First; for DR_Register use record DU at 0 range 0 .. 3; DT at 0 range 4 .. 5; Reserved_6_7 at 0 range 6 .. 7; MU at 0 range 8 .. 11; MT at 0 range 12 .. 12; WDU at 0 range 13 .. 15; YU at 0 range 16 .. 19; YT at 0 range 20 .. 23; Reserved_24_31 at 0 range 24 .. 31; end record; subtype CR_TSEDGE_Field is STM32_SVD.Bit; subtype CR_REFCKON_Field is STM32_SVD.Bit; subtype CR_BYPSHAD_Field is STM32_SVD.Bit; subtype CR_FMT_Field is STM32_SVD.Bit; subtype CR_ALRAE_Field is STM32_SVD.Bit; subtype CR_TSE_Field is STM32_SVD.Bit; subtype CR_ALRAIE_Field is STM32_SVD.Bit; subtype CR_TSIE_Field is STM32_SVD.Bit; subtype CR_ADD1H_Field is STM32_SVD.Bit; subtype CR_SUB1H_Field is STM32_SVD.Bit; subtype CR_BKP_Field is STM32_SVD.Bit; subtype CR_COSEL_Field is STM32_SVD.Bit; subtype CR_POL_Field is STM32_SVD.Bit; subtype CR_OSEL_Field is STM32_SVD.UInt2; subtype CR_COE_Field is STM32_SVD.Bit; -- control register type CR_Register is record -- unspecified Reserved_0_2 : STM32_SVD.UInt3 := 16#0#; -- Time-stamp event active edge TSEDGE : CR_TSEDGE_Field := 16#0#; -- RTC_REFIN reference clock detection enable (50 or 60 Hz) REFCKON : CR_REFCKON_Field := 16#0#; -- Bypass the shadow registers BYPSHAD : CR_BYPSHAD_Field := 16#0#; -- Hour format FMT : CR_FMT_Field := 16#0#; -- unspecified Reserved_7_7 : STM32_SVD.Bit := 16#0#; -- Alarm A enable ALRAE : CR_ALRAE_Field := 16#0#; -- unspecified Reserved_9_10 : STM32_SVD.UInt2 := 16#0#; -- timestamp enable TSE : CR_TSE_Field := 16#0#; -- Alarm A interrupt enable ALRAIE : CR_ALRAIE_Field := 16#0#; -- unspecified Reserved_13_14 : STM32_SVD.UInt2 := 16#0#; -- Time-stamp interrupt enable TSIE : CR_TSIE_Field := 16#0#; -- Write-only. Add 1 hour (summer time change) ADD1H : CR_ADD1H_Field := 16#0#; -- Write-only. Subtract 1 hour (winter time change) SUB1H : CR_SUB1H_Field := 16#0#; -- Backup BKP : CR_BKP_Field := 16#0#; -- Calibration output selection COSEL : CR_COSEL_Field := 16#0#; -- Output polarity POL : CR_POL_Field := 16#0#; -- Output selection OSEL : CR_OSEL_Field := 16#0#; -- Calibration output enable COE : CR_COE_Field := 16#0#; -- unspecified Reserved_24_31 : STM32_SVD.Byte := 16#0#; end record with Volatile_Full_Access, Size => 32, Bit_Order => System.Low_Order_First; for CR_Register use record Reserved_0_2 at 0 range 0 .. 2; TSEDGE at 0 range 3 .. 3; REFCKON at 0 range 4 .. 4; BYPSHAD at 0 range 5 .. 5; FMT at 0 range 6 .. 6; Reserved_7_7 at 0 range 7 .. 7; ALRAE at 0 range 8 .. 8; Reserved_9_10 at 0 range 9 .. 10; TSE at 0 range 11 .. 11; ALRAIE at 0 range 12 .. 12; Reserved_13_14 at 0 range 13 .. 14; TSIE at 0 range 15 .. 15; ADD1H at 0 range 16 .. 16; SUB1H at 0 range 17 .. 17; BKP at 0 range 18 .. 18; COSEL at 0 range 19 .. 19; POL at 0 range 20 .. 20; OSEL at 0 range 21 .. 22; COE at 0 range 23 .. 23; Reserved_24_31 at 0 range 24 .. 31; end record; subtype ISR_ALRAWF_Field is STM32_SVD.Bit; subtype ISR_SHPF_Field is STM32_SVD.Bit; subtype ISR_INITS_Field is STM32_SVD.Bit; subtype ISR_RSF_Field is STM32_SVD.Bit; subtype ISR_INITF_Field is STM32_SVD.Bit; subtype ISR_INIT_Field is STM32_SVD.Bit; subtype ISR_ALRAF_Field is STM32_SVD.Bit; subtype ISR_TSF_Field is STM32_SVD.Bit; subtype ISR_TSOVF_Field is STM32_SVD.Bit; subtype ISR_TAMP1F_Field is STM32_SVD.Bit; subtype ISR_TAMP2F_Field is STM32_SVD.Bit; subtype ISR_RECALPF_Field is STM32_SVD.Bit; -- initialization and status register type ISR_Register is record -- Read-only. Alarm A write flag ALRAWF : ISR_ALRAWF_Field := 16#1#; -- unspecified Reserved_1_2 : STM32_SVD.UInt2 := 16#3#; -- Shift operation pending SHPF : ISR_SHPF_Field := 16#0#; -- Read-only. Initialization status flag INITS : ISR_INITS_Field := 16#0#; -- Registers synchronization flag RSF : ISR_RSF_Field := 16#0#; -- Read-only. Initialization flag INITF : ISR_INITF_Field := 16#0#; -- Initialization mode INIT : ISR_INIT_Field := 16#0#; -- Alarm A flag ALRAF : ISR_ALRAF_Field := 16#0#; -- unspecified Reserved_9_10 : STM32_SVD.UInt2 := 16#0#; -- Time-stamp flag TSF : ISR_TSF_Field := 16#0#; -- Time-stamp overflow flag TSOVF : ISR_TSOVF_Field := 16#0#; -- RTC_TAMP1 detection flag TAMP1F : ISR_TAMP1F_Field := 16#0#; -- RTC_TAMP2 detection flag TAMP2F : ISR_TAMP2F_Field := 16#0#; -- unspecified Reserved_15_15 : STM32_SVD.Bit := 16#0#; -- Read-only. Recalibration pending Flag RECALPF : ISR_RECALPF_Field := 16#0#; -- unspecified Reserved_17_31 : STM32_SVD.UInt15 := 16#0#; end record with Volatile_Full_Access, Size => 32, Bit_Order => System.Low_Order_First; for ISR_Register use record ALRAWF at 0 range 0 .. 0; Reserved_1_2 at 0 range 1 .. 2; SHPF at 0 range 3 .. 3; INITS at 0 range 4 .. 4; RSF at 0 range 5 .. 5; INITF at 0 range 6 .. 6; INIT at 0 range 7 .. 7; ALRAF at 0 range 8 .. 8; Reserved_9_10 at 0 range 9 .. 10; TSF at 0 range 11 .. 11; TSOVF at 0 range 12 .. 12; TAMP1F at 0 range 13 .. 13; TAMP2F at 0 range 14 .. 14; Reserved_15_15 at 0 range 15 .. 15; RECALPF at 0 range 16 .. 16; Reserved_17_31 at 0 range 17 .. 31; end record; subtype PRER_PREDIV_S_Field is STM32_SVD.UInt15; subtype PRER_PREDIV_A_Field is STM32_SVD.UInt7; -- prescaler register type PRER_Register is record -- Synchronous prescaler factor PREDIV_S : PRER_PREDIV_S_Field := 16#FF#; -- unspecified Reserved_15_15 : STM32_SVD.Bit := 16#0#; -- Asynchronous prescaler factor PREDIV_A : PRER_PREDIV_A_Field := 16#7F#; -- unspecified Reserved_23_31 : STM32_SVD.UInt9 := 16#0#; end record with Volatile_Full_Access, Size => 32, Bit_Order => System.Low_Order_First; for PRER_Register use record PREDIV_S at 0 range 0 .. 14; Reserved_15_15 at 0 range 15 .. 15; PREDIV_A at 0 range 16 .. 22; Reserved_23_31 at 0 range 23 .. 31; end record; subtype ALRMAR_SU_Field is STM32_SVD.UInt4; subtype ALRMAR_ST_Field is STM32_SVD.UInt3; subtype ALRMAR_MSK1_Field is STM32_SVD.Bit; subtype ALRMAR_MNU_Field is STM32_SVD.UInt4; subtype ALRMAR_MNT_Field is STM32_SVD.UInt3; subtype ALRMAR_MSK2_Field is STM32_SVD.Bit; subtype ALRMAR_HU_Field is STM32_SVD.UInt4; subtype ALRMAR_HT_Field is STM32_SVD.UInt2; subtype ALRMAR_PM_Field is STM32_SVD.Bit; subtype ALRMAR_MSK3_Field is STM32_SVD.Bit; subtype ALRMAR_DU_Field is STM32_SVD.UInt4; subtype ALRMAR_DT_Field is STM32_SVD.UInt2; subtype ALRMAR_WDSEL_Field is STM32_SVD.Bit; subtype ALRMAR_MSK4_Field is STM32_SVD.Bit; -- alarm A register type ALRMAR_Register is record -- Second units in BCD format. SU : ALRMAR_SU_Field := 16#0#; -- Second tens in BCD format. ST : ALRMAR_ST_Field := 16#0#; -- Alarm A seconds mask MSK1 : ALRMAR_MSK1_Field := 16#0#; -- Minute units in BCD format. MNU : ALRMAR_MNU_Field := 16#0#; -- Minute tens in BCD format. MNT : ALRMAR_MNT_Field := 16#0#; -- Alarm A minutes mask MSK2 : ALRMAR_MSK2_Field := 16#0#; -- Hour units in BCD format. HU : ALRMAR_HU_Field := 16#0#; -- Hour tens in BCD format. HT : ALRMAR_HT_Field := 16#0#; -- AM/PM notation PM : ALRMAR_PM_Field := 16#0#; -- Alarm A hours mask MSK3 : ALRMAR_MSK3_Field := 16#0#; -- Date units or day in BCD format. DU : ALRMAR_DU_Field := 16#0#; -- Date tens in BCD format. DT : ALRMAR_DT_Field := 16#0#; -- Week day selection WDSEL : ALRMAR_WDSEL_Field := 16#0#; -- Alarm A date mask MSK4 : ALRMAR_MSK4_Field := 16#0#; end record with Volatile_Full_Access, Size => 32, Bit_Order => System.Low_Order_First; for ALRMAR_Register use record SU at 0 range 0 .. 3; ST at 0 range 4 .. 6; MSK1 at 0 range 7 .. 7; MNU at 0 range 8 .. 11; MNT at 0 range 12 .. 14; MSK2 at 0 range 15 .. 15; HU at 0 range 16 .. 19; HT at 0 range 20 .. 21; PM at 0 range 22 .. 22; MSK3 at 0 range 23 .. 23; DU at 0 range 24 .. 27; DT at 0 range 28 .. 29; WDSEL at 0 range 30 .. 30; MSK4 at 0 range 31 .. 31; end record; subtype WPR_KEY_Field is STM32_SVD.Byte; -- write protection register type WPR_Register is record -- Write-only. Write protection key KEY : WPR_KEY_Field := 16#0#; -- unspecified Reserved_8_31 : STM32_SVD.UInt24 := 16#0#; end record with Volatile_Full_Access, Size => 32, Bit_Order => System.Low_Order_First; for WPR_Register use record KEY at 0 range 0 .. 7; Reserved_8_31 at 0 range 8 .. 31; end record; subtype SSR_SS_Field is STM32_SVD.UInt16; -- sub second register type SSR_Register is record -- Read-only. Sub second value SS : SSR_SS_Field; -- unspecified Reserved_16_31 : STM32_SVD.UInt16; end record with Volatile_Full_Access, Size => 32, Bit_Order => System.Low_Order_First; for SSR_Register use record SS at 0 range 0 .. 15; Reserved_16_31 at 0 range 16 .. 31; end record; subtype SHIFTR_SUBFS_Field is STM32_SVD.UInt15; subtype SHIFTR_ADD1S_Field is STM32_SVD.Bit; -- shift control register type SHIFTR_Register is record -- Write-only. Subtract a fraction of a second SUBFS : SHIFTR_SUBFS_Field := 16#0#; -- unspecified Reserved_15_30 : STM32_SVD.UInt16 := 16#0#; -- Write-only. Reserved ADD1S : SHIFTR_ADD1S_Field := 16#0#; end record with Volatile_Full_Access, Size => 32, Bit_Order => System.Low_Order_First; for SHIFTR_Register use record SUBFS at 0 range 0 .. 14; Reserved_15_30 at 0 range 15 .. 30; ADD1S at 0 range 31 .. 31; end record; subtype TSTR_SU_Field is STM32_SVD.UInt4; subtype TSTR_ST_Field is STM32_SVD.UInt3; subtype TSTR_MNU_Field is STM32_SVD.UInt4; subtype TSTR_MNT_Field is STM32_SVD.UInt3; subtype TSTR_HU_Field is STM32_SVD.UInt4; subtype TSTR_HT_Field is STM32_SVD.UInt2; subtype TSTR_PM_Field is STM32_SVD.Bit; -- timestamp time register type TSTR_Register is record -- Read-only. Second units in BCD format. SU : TSTR_SU_Field; -- Read-only. Second tens in BCD format. ST : TSTR_ST_Field; -- unspecified Reserved_7_7 : STM32_SVD.Bit; -- Read-only. Minute units in BCD format. MNU : TSTR_MNU_Field; -- Read-only. Minute tens in BCD format. MNT : TSTR_MNT_Field; -- unspecified Reserved_15_15 : STM32_SVD.Bit; -- Read-only. Hour units in BCD format. HU : TSTR_HU_Field; -- Read-only. Hour tens in BCD format. HT : TSTR_HT_Field; -- Read-only. AM/PM notation PM : TSTR_PM_Field; -- unspecified Reserved_23_31 : STM32_SVD.UInt9; end record with Volatile_Full_Access, Size => 32, Bit_Order => System.Low_Order_First; for TSTR_Register use record SU at 0 range 0 .. 3; ST at 0 range 4 .. 6; Reserved_7_7 at 0 range 7 .. 7; MNU at 0 range 8 .. 11; MNT at 0 range 12 .. 14; Reserved_15_15 at 0 range 15 .. 15; HU at 0 range 16 .. 19; HT at 0 range 20 .. 21; PM at 0 range 22 .. 22; Reserved_23_31 at 0 range 23 .. 31; end record; subtype TSDR_DU_Field is STM32_SVD.UInt4; subtype TSDR_DT_Field is STM32_SVD.UInt2; subtype TSDR_MU_Field is STM32_SVD.UInt4; subtype TSDR_MT_Field is STM32_SVD.Bit; subtype TSDR_WDU_Field is STM32_SVD.UInt3; -- timestamp date register type TSDR_Register is record -- Read-only. Date units in BCD format DU : TSDR_DU_Field; -- Read-only. Date tens in BCD format DT : TSDR_DT_Field; -- unspecified Reserved_6_7 : STM32_SVD.UInt2; -- Read-only. Month units in BCD format MU : TSDR_MU_Field; -- Read-only. Month tens in BCD format MT : TSDR_MT_Field; -- Read-only. Week day units WDU : TSDR_WDU_Field; -- unspecified Reserved_16_31 : STM32_SVD.UInt16; end record with Volatile_Full_Access, Size => 32, Bit_Order => System.Low_Order_First; for TSDR_Register use record DU at 0 range 0 .. 3; DT at 0 range 4 .. 5; Reserved_6_7 at 0 range 6 .. 7; MU at 0 range 8 .. 11; MT at 0 range 12 .. 12; WDU at 0 range 13 .. 15; Reserved_16_31 at 0 range 16 .. 31; end record; subtype TSSSR_SS_Field is STM32_SVD.UInt16; -- time-stamp sub second register type TSSSR_Register is record -- Read-only. Sub second value SS : TSSSR_SS_Field; -- unspecified Reserved_16_31 : STM32_SVD.UInt16; end record with Volatile_Full_Access, Size => 32, Bit_Order => System.Low_Order_First; for TSSSR_Register use record SS at 0 range 0 .. 15; Reserved_16_31 at 0 range 16 .. 31; end record; subtype CALR_CALM_Field is STM32_SVD.UInt9; subtype CALR_CALW16_Field is STM32_SVD.Bit; subtype CALR_CALW8_Field is STM32_SVD.Bit; subtype CALR_CALP_Field is STM32_SVD.Bit; -- calibration register type CALR_Register is record -- Calibration minus CALM : CALR_CALM_Field := 16#0#; -- unspecified Reserved_9_12 : STM32_SVD.UInt4 := 16#0#; -- Reserved CALW16 : CALR_CALW16_Field := 16#0#; -- Use a 16-second calibration cycle period CALW8 : CALR_CALW8_Field := 16#0#; -- Use an 8-second calibration cycle period CALP : CALR_CALP_Field := 16#0#; -- unspecified Reserved_16_31 : STM32_SVD.UInt16 := 16#0#; end record with Volatile_Full_Access, Size => 32, Bit_Order => System.Low_Order_First; for CALR_Register use record CALM at 0 range 0 .. 8; Reserved_9_12 at 0 range 9 .. 12; CALW16 at 0 range 13 .. 13; CALW8 at 0 range 14 .. 14; CALP at 0 range 15 .. 15; Reserved_16_31 at 0 range 16 .. 31; end record; subtype TAFCR_TAMP1E_Field is STM32_SVD.Bit; subtype TAFCR_TAMP1TRG_Field is STM32_SVD.Bit; subtype TAFCR_TAMPIE_Field is STM32_SVD.Bit; subtype TAFCR_TAMP2E_Field is STM32_SVD.Bit; subtype TAFCR_TAMP2_TRG_Field is STM32_SVD.Bit; subtype TAFCR_TAMPTS_Field is STM32_SVD.Bit; subtype TAFCR_TAMPFREQ_Field is STM32_SVD.UInt3; subtype TAFCR_TAMPFLT_Field is STM32_SVD.UInt2; subtype TAFCR_TAMP_PRCH_Field is STM32_SVD.UInt2; subtype TAFCR_TAMP_PUDIS_Field is STM32_SVD.Bit; subtype TAFCR_PC13VALUE_Field is STM32_SVD.Bit; subtype TAFCR_PC13MODE_Field is STM32_SVD.Bit; subtype TAFCR_PC14VALUE_Field is STM32_SVD.Bit; subtype TAFCR_PC14MODE_Field is STM32_SVD.Bit; subtype TAFCR_PC15VALUE_Field is STM32_SVD.Bit; subtype TAFCR_PC15MODE_Field is STM32_SVD.Bit; -- tamper and alternate function configuration register type TAFCR_Register is record -- RTC_TAMP1 input detection enable TAMP1E : TAFCR_TAMP1E_Field := 16#0#; -- Active level for RTC_TAMP1 input TAMP1TRG : TAFCR_TAMP1TRG_Field := 16#0#; -- Tamper interrupt enable TAMPIE : TAFCR_TAMPIE_Field := 16#0#; -- RTC_TAMP2 input detection enable TAMP2E : TAFCR_TAMP2E_Field := 16#0#; -- Active level for RTC_TAMP2 input TAMP2_TRG : TAFCR_TAMP2_TRG_Field := 16#0#; -- unspecified Reserved_5_6 : STM32_SVD.UInt2 := 16#0#; -- Activate timestamp on tamper detection event TAMPTS : TAFCR_TAMPTS_Field := 16#0#; -- Tamper sampling frequency TAMPFREQ : TAFCR_TAMPFREQ_Field := 16#0#; -- RTC_TAMPx filter count TAMPFLT : TAFCR_TAMPFLT_Field := 16#0#; -- RTC_TAMPx precharge duration TAMP_PRCH : TAFCR_TAMP_PRCH_Field := 16#0#; -- RTC_TAMPx pull-up disable TAMP_PUDIS : TAFCR_TAMP_PUDIS_Field := 16#0#; -- unspecified Reserved_16_17 : STM32_SVD.UInt2 := 16#0#; -- RTC_ALARM output type/PC13 value PC13VALUE : TAFCR_PC13VALUE_Field := 16#0#; -- PC13 mode PC13MODE : TAFCR_PC13MODE_Field := 16#0#; -- PC14 value PC14VALUE : TAFCR_PC14VALUE_Field := 16#0#; -- PC14 mode PC14MODE : TAFCR_PC14MODE_Field := 16#0#; -- PC15 value PC15VALUE : TAFCR_PC15VALUE_Field := 16#0#; -- PC15 mode PC15MODE : TAFCR_PC15MODE_Field := 16#0#; -- unspecified Reserved_24_31 : STM32_SVD.Byte := 16#0#; end record with Volatile_Full_Access, Size => 32, Bit_Order => System.Low_Order_First; for TAFCR_Register use record TAMP1E at 0 range 0 .. 0; TAMP1TRG at 0 range 1 .. 1; TAMPIE at 0 range 2 .. 2; TAMP2E at 0 range 3 .. 3; TAMP2_TRG at 0 range 4 .. 4; Reserved_5_6 at 0 range 5 .. 6; TAMPTS at 0 range 7 .. 7; TAMPFREQ at 0 range 8 .. 10; TAMPFLT at 0 range 11 .. 12; TAMP_PRCH at 0 range 13 .. 14; TAMP_PUDIS at 0 range 15 .. 15; Reserved_16_17 at 0 range 16 .. 17; PC13VALUE at 0 range 18 .. 18; PC13MODE at 0 range 19 .. 19; PC14VALUE at 0 range 20 .. 20; PC14MODE at 0 range 21 .. 21; PC15VALUE at 0 range 22 .. 22; PC15MODE at 0 range 23 .. 23; Reserved_24_31 at 0 range 24 .. 31; end record; subtype ALRMASSR_SS_Field is STM32_SVD.UInt15; subtype ALRMASSR_MASKSS_Field is STM32_SVD.UInt4; -- alarm A sub second register type ALRMASSR_Register is record -- Sub seconds value SS : ALRMASSR_SS_Field := 16#0#; -- unspecified Reserved_15_23 : STM32_SVD.UInt9 := 16#0#; -- Mask the most-significant bits starting at this bit MASKSS : ALRMASSR_MASKSS_Field := 16#0#; -- unspecified Reserved_28_31 : STM32_SVD.UInt4 := 16#0#; end record with Volatile_Full_Access, Size => 32, Bit_Order => System.Low_Order_First; for ALRMASSR_Register use record SS at 0 range 0 .. 14; Reserved_15_23 at 0 range 15 .. 23; MASKSS at 0 range 24 .. 27; Reserved_28_31 at 0 range 28 .. 31; end record; ----------------- -- Peripherals -- ----------------- -- Real-time clock type RTC_Peripheral is record -- time register TR : aliased TR_Register; -- date register DR : aliased DR_Register; -- control register CR : aliased CR_Register; -- initialization and status register ISR : aliased ISR_Register; -- prescaler register PRER : aliased PRER_Register; -- alarm A register ALRMAR : aliased ALRMAR_Register; -- write protection register WPR : aliased WPR_Register; -- sub second register SSR : aliased SSR_Register; -- shift control register SHIFTR : aliased SHIFTR_Register; -- timestamp time register TSTR : aliased TSTR_Register; -- timestamp date register TSDR : aliased TSDR_Register; -- time-stamp sub second register TSSSR : aliased TSSSR_Register; -- calibration register CALR : aliased CALR_Register; -- tamper and alternate function configuration register TAFCR : aliased TAFCR_Register; -- alarm A sub second register ALRMASSR : aliased ALRMASSR_Register; -- backup register BKP0R : aliased STM32_SVD.UInt32; -- backup register BKP1R : aliased STM32_SVD.UInt32; -- backup register BKP2R : aliased STM32_SVD.UInt32; -- backup register BKP3R : aliased STM32_SVD.UInt32; -- backup register BKP4R : aliased STM32_SVD.UInt32; end record with Volatile; for RTC_Peripheral use record TR at 16#0# range 0 .. 31; DR at 16#4# range 0 .. 31; CR at 16#8# range 0 .. 31; ISR at 16#C# range 0 .. 31; PRER at 16#10# range 0 .. 31; ALRMAR at 16#1C# range 0 .. 31; WPR at 16#24# range 0 .. 31; SSR at 16#28# range 0 .. 31; SHIFTR at 16#2C# range 0 .. 31; TSTR at 16#30# range 0 .. 31; TSDR at 16#34# range 0 .. 31; TSSSR at 16#38# range 0 .. 31; CALR at 16#3C# range 0 .. 31; TAFCR at 16#40# range 0 .. 31; ALRMASSR at 16#44# range 0 .. 31; BKP0R at 16#50# range 0 .. 31; BKP1R at 16#54# range 0 .. 31; BKP2R at 16#58# range 0 .. 31; BKP3R at 16#5C# range 0 .. 31; BKP4R at 16#60# range 0 .. 31; end record; -- Real-time clock RTC_Periph : aliased RTC_Peripheral with Import, Address => System'To_Address (16#40002800#); end STM32_SVD.RTC;
charlie5/cBound
Ada
1,891
ads
-- This file is generated by SWIG. Please do not modify by hand. -- with Interfaces; with swig; with Interfaces.C; with Interfaces.C.Pointers; package xcb.xcb_glx_get_histogram_parameteriv_reply_t is -- Item -- type Item is record response_type : aliased Interfaces.Unsigned_8; pad0 : aliased Interfaces.Unsigned_8; sequence : aliased Interfaces.Unsigned_16; length : aliased Interfaces.Unsigned_32; pad1 : aliased swig.int8_t_Array (0 .. 3); n : aliased Interfaces.Unsigned_32; datum : aliased Interfaces.Integer_32; pad2 : aliased swig.int8_t_Array (0 .. 11); end record; -- Item_Array -- type Item_Array is array (Interfaces.C .size_t range <>) of aliased xcb .xcb_glx_get_histogram_parameteriv_reply_t .Item; -- Pointer -- package C_Pointers is new Interfaces.C.Pointers (Index => Interfaces.C.size_t, Element => xcb.xcb_glx_get_histogram_parameteriv_reply_t.Item, Element_Array => xcb.xcb_glx_get_histogram_parameteriv_reply_t.Item_Array, Default_Terminator => (others => <>)); subtype Pointer is C_Pointers.Pointer; -- Pointer_Array -- type Pointer_Array is array (Interfaces.C .size_t range <>) of aliased xcb .xcb_glx_get_histogram_parameteriv_reply_t .Pointer; -- Pointer_Pointer -- package C_Pointer_Pointers is new Interfaces.C.Pointers (Index => Interfaces.C.size_t, Element => xcb.xcb_glx_get_histogram_parameteriv_reply_t.Pointer, Element_Array => xcb.xcb_glx_get_histogram_parameteriv_reply_t.Pointer_Array, Default_Terminator => null); subtype Pointer_Pointer is C_Pointer_Pointers.Pointer; end xcb.xcb_glx_get_histogram_parameteriv_reply_t;
reznikmm/matreshka
Ada
5,229
ads
------------------------------------------------------------------------------ -- -- -- Matreshka Project -- -- -- -- Ada Modeling Framework -- -- -- -- Runtime Library Component -- -- -- ------------------------------------------------------------------------------ -- -- -- Copyright © 2012-2013, Vadim Godunko <[email protected]> -- -- All rights reserved. -- -- -- -- Redistribution and use in source and binary forms, with or without -- -- modification, are permitted provided that the following conditions -- -- are met: -- -- -- -- * Redistributions of source code must retain the above copyright -- -- notice, this list of conditions and the following disclaimer. -- -- -- -- * Redistributions in binary form must reproduce the above copyright -- -- notice, this list of conditions and the following disclaimer in the -- -- documentation and/or other materials provided with the distribution. -- -- -- -- * Neither the name of the Vadim Godunko, IE nor the names of its -- -- contributors may be used to endorse or promote products derived from -- -- this software without specific prior written permission. -- -- -- -- THIS SOFTWARE IS PROVIDED BY THE COPYRIGHT HOLDERS AND CONTRIBUTORS -- -- "AS IS" AND ANY EXPRESS OR IMPLIED WARRANTIES, INCLUDING, BUT NOT -- -- LIMITED TO, THE IMPLIED WARRANTIES OF MERCHANTABILITY AND FITNESS FOR -- -- A PARTICULAR PURPOSE ARE DISCLAIMED. IN NO EVENT SHALL THE COPYRIGHT -- -- HOLDER OR CONTRIBUTORS BE LIABLE FOR ANY DIRECT, INDIRECT, INCIDENTAL, -- -- SPECIAL, EXEMPLARY, OR CONSEQUENTIAL DAMAGES (INCLUDING, BUT NOT LIMITED -- -- TO, PROCUREMENT OF SUBSTITUTE GOODS OR SERVICES; LOSS OF USE, DATA, OR -- -- PROFITS; OR BUSINESS INTERRUPTION) HOWEVER CAUSED AND ON ANY THEORY OF -- -- LIABILITY, WHETHER IN CONTRACT, STRICT LIABILITY, OR TORT (INCLUDING -- -- NEGLIGENCE OR OTHERWISE) ARISING IN ANY WAY OUT OF THE USE OF THIS -- -- SOFTWARE, EVEN IF ADVISED OF THE POSSIBILITY OF SUCH DAMAGE. -- -- -- ------------------------------------------------------------------------------ -- $Revision$ $Date$ ------------------------------------------------------------------------------ -- This file is generated, don't edit it. ------------------------------------------------------------------------------ with AMF.Generic_Collections; package AMF.OCL.Tuple_Literal_Parts.Collections is pragma Preelaborate; package OCL_Tuple_Literal_Part_Collections is new AMF.Generic_Collections (OCL_Tuple_Literal_Part, OCL_Tuple_Literal_Part_Access); type Set_Of_OCL_Tuple_Literal_Part is new OCL_Tuple_Literal_Part_Collections.Set with null record; Empty_Set_Of_OCL_Tuple_Literal_Part : constant Set_Of_OCL_Tuple_Literal_Part; type Ordered_Set_Of_OCL_Tuple_Literal_Part is new OCL_Tuple_Literal_Part_Collections.Ordered_Set with null record; Empty_Ordered_Set_Of_OCL_Tuple_Literal_Part : constant Ordered_Set_Of_OCL_Tuple_Literal_Part; type Bag_Of_OCL_Tuple_Literal_Part is new OCL_Tuple_Literal_Part_Collections.Bag with null record; Empty_Bag_Of_OCL_Tuple_Literal_Part : constant Bag_Of_OCL_Tuple_Literal_Part; type Sequence_Of_OCL_Tuple_Literal_Part is new OCL_Tuple_Literal_Part_Collections.Sequence with null record; Empty_Sequence_Of_OCL_Tuple_Literal_Part : constant Sequence_Of_OCL_Tuple_Literal_Part; private Empty_Set_Of_OCL_Tuple_Literal_Part : constant Set_Of_OCL_Tuple_Literal_Part := (OCL_Tuple_Literal_Part_Collections.Set with null record); Empty_Ordered_Set_Of_OCL_Tuple_Literal_Part : constant Ordered_Set_Of_OCL_Tuple_Literal_Part := (OCL_Tuple_Literal_Part_Collections.Ordered_Set with null record); Empty_Bag_Of_OCL_Tuple_Literal_Part : constant Bag_Of_OCL_Tuple_Literal_Part := (OCL_Tuple_Literal_Part_Collections.Bag with null record); Empty_Sequence_Of_OCL_Tuple_Literal_Part : constant Sequence_Of_OCL_Tuple_Literal_Part := (OCL_Tuple_Literal_Part_Collections.Sequence with null record); end AMF.OCL.Tuple_Literal_Parts.Collections;
zhmu/ananas
Ada
21,302
adb
------------------------------------------------------------------------------ -- -- -- GNAT RUN-TIME COMPONENTS -- -- -- -- ADA.NUMERICS.BIG_NUMBERS.BIG_INTEGERS -- -- -- -- B o d y -- -- -- -- Copyright (C) 2019-2022, 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 is the GMP version of this package with Ada.Unchecked_Conversion; with Ada.Unchecked_Deallocation; with Interfaces.C; use Interfaces.C; with Interfaces.C.Strings; use Interfaces.C.Strings; with Ada.Characters.Handling; use Ada.Characters.Handling; package body Ada.Numerics.Big_Numbers.Big_Integers is use System; pragma Linker_Options ("-lgmp"); type mpz_t is record mp_alloc : Integer; mp_size : Integer; mp_d : System.Address; end record; pragma Convention (C, mpz_t); type mpz_t_ptr is access all mpz_t; function To_Mpz is new Ada.Unchecked_Conversion (System.Address, mpz_t_ptr); function To_Address is new Ada.Unchecked_Conversion (mpz_t_ptr, System.Address); function Get_Mpz (Arg : Big_Integer) return mpz_t_ptr is (To_Mpz (Arg.Value.C)); -- Return the mpz_t value stored in Arg procedure Set_Mpz (Arg : in out Big_Integer; Value : mpz_t_ptr) with Inline; -- Set the mpz_t value stored in Arg to Value procedure Allocate (This : in out Big_Integer) with Inline; -- Allocate a Big_Integer, including the underlying mpz procedure mpz_init_set (ROP : access mpz_t; OP : access constant mpz_t); pragma Import (C, mpz_init_set, "__gmpz_init_set"); procedure mpz_set (ROP : access mpz_t; OP : access constant mpz_t); pragma Import (C, mpz_set, "__gmpz_set"); function mpz_cmp (OP1, OP2 : access constant mpz_t) return Integer; pragma Import (C, mpz_cmp, "__gmpz_cmp"); function mpz_cmp_ui (OP1 : access constant mpz_t; OP2 : unsigned_long) return Integer; pragma Import (C, mpz_cmp_ui, "__gmpz_cmp_ui"); procedure mpz_set_si (ROP : access mpz_t; OP : long); pragma Import (C, mpz_set_si, "__gmpz_set_si"); procedure mpz_set_ui (ROP : access mpz_t; OP : unsigned_long); pragma Import (C, mpz_set_ui, "__gmpz_set_ui"); function mpz_get_si (OP : access constant mpz_t) return long; pragma Import (C, mpz_get_si, "__gmpz_get_si"); function mpz_get_ui (OP : access constant mpz_t) return unsigned_long; pragma Import (C, mpz_get_ui, "__gmpz_get_ui"); procedure mpz_neg (ROP : access mpz_t; OP : access constant mpz_t); pragma Import (C, mpz_neg, "__gmpz_neg"); procedure mpz_sub (ROP : access mpz_t; OP1, OP2 : access constant mpz_t); pragma Import (C, mpz_sub, "__gmpz_sub"); ------------- -- Set_Mpz -- ------------- procedure Set_Mpz (Arg : in out Big_Integer; Value : mpz_t_ptr) is begin Arg.Value.C := To_Address (Value); end Set_Mpz; -------------- -- Is_Valid -- -------------- function Is_Valid (Arg : Big_Integer) return Boolean is (Arg.Value.C /= System.Null_Address); --------- -- "=" -- --------- function "=" (L, R : Valid_Big_Integer) return Boolean is begin return mpz_cmp (Get_Mpz (L), Get_Mpz (R)) = 0; end "="; --------- -- "<" -- --------- function "<" (L, R : Valid_Big_Integer) return Boolean is begin return mpz_cmp (Get_Mpz (L), Get_Mpz (R)) < 0; end "<"; ---------- -- "<=" -- ---------- function "<=" (L, R : Valid_Big_Integer) return Boolean is begin return mpz_cmp (Get_Mpz (L), Get_Mpz (R)) <= 0; end "<="; --------- -- ">" -- --------- function ">" (L, R : Valid_Big_Integer) return Boolean is begin return mpz_cmp (Get_Mpz (L), Get_Mpz (R)) > 0; end ">"; ---------- -- ">=" -- ---------- function ">=" (L, R : Valid_Big_Integer) return Boolean is begin return mpz_cmp (Get_Mpz (L), Get_Mpz (R)) >= 0; end ">="; -------------------- -- To_Big_Integer -- -------------------- function To_Big_Integer (Arg : Integer) return Valid_Big_Integer is Result : Big_Integer; begin Allocate (Result); mpz_set_si (Get_Mpz (Result), long (Arg)); return Result; end To_Big_Integer; ---------------- -- To_Integer -- ---------------- function To_Integer (Arg : Valid_Big_Integer) return Integer is begin return Integer (mpz_get_si (Get_Mpz (Arg))); end To_Integer; ------------------------ -- Signed_Conversions -- ------------------------ package body Signed_Conversions is -------------------- -- To_Big_Integer -- -------------------- function To_Big_Integer (Arg : Int) return Valid_Big_Integer is Result : Big_Integer; begin Allocate (Result); mpz_set_si (Get_Mpz (Result), long (Arg)); return Result; end To_Big_Integer; ---------------------- -- From_Big_Integer -- ---------------------- function From_Big_Integer (Arg : Valid_Big_Integer) return Int is begin return Int (mpz_get_si (Get_Mpz (Arg))); end From_Big_Integer; end Signed_Conversions; -------------------------- -- Unsigned_Conversions -- -------------------------- package body Unsigned_Conversions is -------------------- -- To_Big_Integer -- -------------------- function To_Big_Integer (Arg : Int) return Valid_Big_Integer is Result : Big_Integer; begin Allocate (Result); mpz_set_ui (Get_Mpz (Result), unsigned_long (Arg)); return Result; end To_Big_Integer; ---------------------- -- From_Big_Integer -- ---------------------- function From_Big_Integer (Arg : Valid_Big_Integer) return Int is begin return Int (mpz_get_ui (Get_Mpz (Arg))); end From_Big_Integer; end Unsigned_Conversions; --------------- -- To_String -- --------------- function To_String (Arg : Valid_Big_Integer; Width : Field := 0; Base : Number_Base := 10) return String is function mpz_get_str (STR : System.Address; BASE : Integer; OP : access constant mpz_t) return chars_ptr; pragma Import (C, mpz_get_str, "__gmpz_get_str"); function mpz_sizeinbase (this : access constant mpz_t; base : Integer) return size_t; pragma Import (C, mpz_sizeinbase, "__gmpz_sizeinbase"); function Add_Base (S : String) return String; -- Add base information if Base /= 10 function Leading_Padding (Str : String; Min_Length : Field; Char : Character := ' ') return String; -- Return padding of Char concatenated with Str so that the resulting -- string is at least Min_Length long. function Image (N : Natural) return String; -- Return image of N, with no leading space. -------------- -- Add_Base -- -------------- function Add_Base (S : String) return String is begin if Base = 10 then return S; else return Image (Base) & "#" & To_Upper (S) & "#"; end if; end Add_Base; ----------- -- Image -- ----------- function Image (N : Natural) return String is S : constant String := Natural'Image (N); begin return S (2 .. S'Last); end Image; --------------------- -- Leading_Padding -- --------------------- function Leading_Padding (Str : String; Min_Length : Field; Char : Character := ' ') return String is begin return (1 .. Integer'Max (Integer (Min_Length) - Str'Length, 0) => Char) & Str; end Leading_Padding; Number_Digits : constant Integer := Integer (mpz_sizeinbase (Get_Mpz (Arg), Integer (abs Base))); Buffer : aliased String (1 .. Number_Digits + 2); -- The correct number to allocate is 2 more than Number_Digits in order -- to handle a possible minus sign and the null-terminator. Result : constant chars_ptr := mpz_get_str (Buffer'Address, Integer (Base), Get_Mpz (Arg)); S : constant String := Value (Result); begin if S (1) = '-' then return Leading_Padding ("-" & Add_Base (S (2 .. S'Last)), Width); else return Leading_Padding (" " & Add_Base (S), Width); end if; end To_String; ----------------- -- From_String -- ----------------- function From_String (Arg : String) return Valid_Big_Integer is function mpz_set_str (this : access mpz_t; str : System.Address; base : Integer := 10) return Integer; pragma Import (C, mpz_set_str, "__gmpz_set_str"); Result : Big_Integer; First : Natural; Last : Natural; Base : Natural; begin Allocate (Result); if Arg (Arg'Last) /= '#' then -- Base 10 number First := Arg'First; Last := Arg'Last; Base := 10; else -- Compute the xx base in a xx#yyyyy# number if Arg'Length < 4 then raise Constraint_Error; end if; First := 0; Last := Arg'Last - 1; for J in Arg'First + 1 .. Last loop if Arg (J) = '#' then First := J; exit; end if; end loop; if First = 0 then raise Constraint_Error; end if; Base := Natural'Value (Arg (Arg'First .. First - 1)); First := First + 1; end if; declare Str : aliased String (1 .. Last - First + 2); Index : Natural := 0; begin -- Strip underscores for J in First .. Last loop if Arg (J) /= '_' then Index := Index + 1; Str (Index) := Arg (J); end if; end loop; Index := Index + 1; Str (Index) := ASCII.NUL; if mpz_set_str (Get_Mpz (Result), Str'Address, Base) /= 0 then raise Constraint_Error; end if; end; return Result; end From_String; --------------- -- Put_Image -- --------------- procedure Put_Image (S : in out Root_Buffer_Type'Class; V : Big_Integer) is -- This is implemented in terms of To_String. It might be more elegant -- and more efficient to do it the other way around, but this is the -- most expedient implementation for now. begin Strings.Text_Buffers.Put_UTF_8 (S, To_String (V)); end Put_Image; --------- -- "+" -- --------- function "+" (L : Valid_Big_Integer) return Valid_Big_Integer is Result : Big_Integer; begin Set_Mpz (Result, new mpz_t); mpz_init_set (Get_Mpz (Result), Get_Mpz (L)); return Result; end "+"; --------- -- "-" -- --------- function "-" (L : Valid_Big_Integer) return Valid_Big_Integer is Result : Big_Integer; begin Allocate (Result); mpz_neg (Get_Mpz (Result), Get_Mpz (L)); return Result; end "-"; ----------- -- "abs" -- ----------- function "abs" (L : Valid_Big_Integer) return Valid_Big_Integer is procedure mpz_abs (ROP : access mpz_t; OP : access constant mpz_t); pragma Import (C, mpz_abs, "__gmpz_abs"); Result : Big_Integer; begin Allocate (Result); mpz_abs (Get_Mpz (Result), Get_Mpz (L)); return Result; end "abs"; --------- -- "+" -- --------- function "+" (L, R : Valid_Big_Integer) return Valid_Big_Integer is procedure mpz_add (ROP : access mpz_t; OP1, OP2 : access constant mpz_t); pragma Import (C, mpz_add, "__gmpz_add"); Result : Big_Integer; begin Allocate (Result); mpz_add (Get_Mpz (Result), Get_Mpz (L), Get_Mpz (R)); return Result; end "+"; --------- -- "-" -- --------- function "-" (L, R : Valid_Big_Integer) return Valid_Big_Integer is Result : Big_Integer; begin Allocate (Result); mpz_sub (Get_Mpz (Result), Get_Mpz (L), Get_Mpz (R)); return Result; end "-"; --------- -- "*" -- --------- function "*" (L, R : Valid_Big_Integer) return Valid_Big_Integer is procedure mpz_mul (ROP : access mpz_t; OP1, OP2 : access constant mpz_t); pragma Import (C, mpz_mul, "__gmpz_mul"); Result : Big_Integer; begin Allocate (Result); mpz_mul (Get_Mpz (Result), Get_Mpz (L), Get_Mpz (R)); return Result; end "*"; --------- -- "/" -- --------- function "/" (L, R : Valid_Big_Integer) return Valid_Big_Integer is procedure mpz_tdiv_q (Q : access mpz_t; N, D : access constant mpz_t); pragma Import (C, mpz_tdiv_q, "__gmpz_tdiv_q"); begin if mpz_cmp_ui (Get_Mpz (R), 0) = 0 then raise Constraint_Error; end if; declare Result : Big_Integer; begin Allocate (Result); mpz_tdiv_q (Get_Mpz (Result), Get_Mpz (L), Get_Mpz (R)); return Result; end; end "/"; ----------- -- "mod" -- ----------- function "mod" (L, R : Valid_Big_Integer) return Valid_Big_Integer is procedure mpz_mod (R : access mpz_t; N, D : access constant mpz_t); pragma Import (C, mpz_mod, "__gmpz_mod"); -- result is always non-negative L_Negative, R_Negative : Boolean; begin if mpz_cmp_ui (Get_Mpz (R), 0) = 0 then raise Constraint_Error; end if; declare Result : Big_Integer; begin Allocate (Result); L_Negative := mpz_cmp_ui (Get_Mpz (L), 0) < 0; R_Negative := mpz_cmp_ui (Get_Mpz (R), 0) < 0; if not (L_Negative or R_Negative) then mpz_mod (Get_Mpz (Result), Get_Mpz (L), Get_Mpz (R)); else -- The GMP library provides operators defined by C semantics, but -- the semantics of Ada's mod operator are not the same as C's -- when negative values are involved. We do the following to -- implement the required Ada semantics. declare Temp_Left : Big_Integer; Temp_Right : Big_Integer; Temp_Result : Big_Integer; begin Allocate (Temp_Result); Set_Mpz (Temp_Left, new mpz_t); Set_Mpz (Temp_Right, new mpz_t); mpz_init_set (Get_Mpz (Temp_Left), Get_Mpz (L)); mpz_init_set (Get_Mpz (Temp_Right), Get_Mpz (R)); if L_Negative then mpz_neg (Get_Mpz (Temp_Left), Get_Mpz (Temp_Left)); end if; if R_Negative then mpz_neg (Get_Mpz (Temp_Right), Get_Mpz (Temp_Right)); end if; -- now both Temp_Left and Temp_Right are nonnegative mpz_mod (Get_Mpz (Temp_Result), Get_Mpz (Temp_Left), Get_Mpz (Temp_Right)); if mpz_cmp_ui (Get_Mpz (Temp_Result), 0) = 0 then -- if Temp_Result is zero we are done mpz_set (Get_Mpz (Result), Get_Mpz (Temp_Result)); elsif L_Negative then if R_Negative then mpz_neg (Get_Mpz (Result), Get_Mpz (Temp_Result)); else -- L is negative but R is not mpz_sub (Get_Mpz (Result), Get_Mpz (Temp_Right), Get_Mpz (Temp_Result)); end if; else pragma Assert (R_Negative); mpz_sub (Get_Mpz (Result), Get_Mpz (Temp_Result), Get_Mpz (Temp_Right)); end if; end; end if; return Result; end; end "mod"; ----------- -- "rem" -- ----------- function "rem" (L, R : Valid_Big_Integer) return Valid_Big_Integer is procedure mpz_tdiv_r (R : access mpz_t; N, D : access constant mpz_t); pragma Import (C, mpz_tdiv_r, "__gmpz_tdiv_r"); -- R will have the same sign as N. begin if mpz_cmp_ui (Get_Mpz (R), 0) = 0 then raise Constraint_Error; end if; declare Result : Big_Integer; begin Allocate (Result); mpz_tdiv_r (R => Get_Mpz (Result), N => Get_Mpz (L), D => Get_Mpz (R)); -- the result takes the sign of N, as required by the RM return Result; end; end "rem"; ---------- -- "**" -- ---------- function "**" (L : Valid_Big_Integer; R : Natural) return Valid_Big_Integer is procedure mpz_pow_ui (ROP : access mpz_t; BASE : access constant mpz_t; EXP : unsigned_long); pragma Import (C, mpz_pow_ui, "__gmpz_pow_ui"); Result : Big_Integer; begin Allocate (Result); mpz_pow_ui (Get_Mpz (Result), Get_Mpz (L), unsigned_long (R)); return Result; end "**"; --------- -- Min -- --------- function Min (L, R : Valid_Big_Integer) return Valid_Big_Integer is (if L < R then L else R); --------- -- Max -- --------- function Max (L, R : Valid_Big_Integer) return Valid_Big_Integer is (if L > R then L else R); ----------------------------- -- Greatest_Common_Divisor -- ----------------------------- function Greatest_Common_Divisor (L, R : Valid_Big_Integer) return Big_Positive is procedure mpz_gcd (ROP : access mpz_t; Op1, Op2 : access constant mpz_t); pragma Import (C, mpz_gcd, "__gmpz_gcd"); Result : Big_Integer; begin Allocate (Result); mpz_gcd (Get_Mpz (Result), Get_Mpz (L), Get_Mpz (R)); return Result; end Greatest_Common_Divisor; -------------- -- Allocate -- -------------- procedure Allocate (This : in out Big_Integer) is procedure mpz_init (this : access mpz_t); pragma Import (C, mpz_init, "__gmpz_init"); begin Set_Mpz (This, new mpz_t); mpz_init (Get_Mpz (This)); end Allocate; ------------ -- Adjust -- ------------ procedure Adjust (This : in out Controlled_Bignum) is Value : constant mpz_t_ptr := To_Mpz (This.C); begin if Value /= null then This.C := To_Address (new mpz_t); mpz_init_set (To_Mpz (This.C), Value); end if; end Adjust; -------------- -- Finalize -- -------------- procedure Finalize (This : in out Controlled_Bignum) is procedure Free is new Ada.Unchecked_Deallocation (mpz_t, mpz_t_ptr); procedure mpz_clear (this : access mpz_t); pragma Import (C, mpz_clear, "__gmpz_clear"); Mpz : mpz_t_ptr; begin if This.C /= System.Null_Address then Mpz := To_Mpz (This.C); mpz_clear (Mpz); Free (Mpz); This.C := System.Null_Address; end if; end Finalize; end Ada.Numerics.Big_Numbers.Big_Integers;
reznikmm/matreshka
Ada
3,714
ads
------------------------------------------------------------------------------ -- -- -- Matreshka Project -- -- -- -- Open Document Toolkit -- -- -- -- Runtime Library Component -- -- -- ------------------------------------------------------------------------------ -- -- -- Copyright © 2014, Vadim Godunko <[email protected]> -- -- All rights reserved. -- -- -- -- Redistribution and use in source and binary forms, with or without -- -- modification, are permitted provided that the following conditions -- -- are met: -- -- -- -- * Redistributions of source code must retain the above copyright -- -- notice, this list of conditions and the following disclaimer. -- -- -- -- * Redistributions in binary form must reproduce the above copyright -- -- notice, this list of conditions and the following disclaimer in the -- -- documentation and/or other materials provided with the distribution. -- -- -- -- * Neither the name of the Vadim Godunko, IE nor the names of its -- -- contributors may be used to endorse or promote products derived from -- -- this software without specific prior written permission. -- -- -- -- THIS SOFTWARE IS PROVIDED BY THE COPYRIGHT HOLDERS AND CONTRIBUTORS -- -- "AS IS" AND ANY EXPRESS OR IMPLIED WARRANTIES, INCLUDING, BUT NOT -- -- LIMITED TO, THE IMPLIED WARRANTIES OF MERCHANTABILITY AND FITNESS FOR -- -- A PARTICULAR PURPOSE ARE DISCLAIMED. IN NO EVENT SHALL THE COPYRIGHT -- -- HOLDER OR CONTRIBUTORS BE LIABLE FOR ANY DIRECT, INDIRECT, INCIDENTAL, -- -- SPECIAL, EXEMPLARY, OR CONSEQUENTIAL DAMAGES (INCLUDING, BUT NOT LIMITED -- -- TO, PROCUREMENT OF SUBSTITUTE GOODS OR SERVICES; LOSS OF USE, DATA, OR -- -- PROFITS; OR BUSINESS INTERRUPTION) HOWEVER CAUSED AND ON ANY THEORY OF -- -- LIABILITY, WHETHER IN CONTRACT, STRICT LIABILITY, OR TORT (INCLUDING -- -- NEGLIGENCE OR OTHERWISE) ARISING IN ANY WAY OUT OF THE USE OF THIS -- -- SOFTWARE, EVEN IF ADVISED OF THE POSSIBILITY OF SUCH DAMAGE. -- -- -- ------------------------------------------------------------------------------ -- $Revision$ $Date$ ------------------------------------------------------------------------------ with XML.DOM.Elements; package ODF.DOM.Table_Data_Pilot_Member_Elements is pragma Preelaborate; type ODF_Table_Data_Pilot_Member is limited interface and XML.DOM.Elements.DOM_Element; type ODF_Table_Data_Pilot_Member_Access is access all ODF_Table_Data_Pilot_Member'Class with Storage_Size => 0; end ODF.DOM.Table_Data_Pilot_Member_Elements;
tum-ei-rcs/StratoX
Ada
5,223
adb
------------------------------------------------------------------------------ -- -- -- GNAT RUN-TIME COMPONENTS -- -- -- -- S Y S T E M . M E M O R Y _ M O V E -- -- -- -- B o d y -- -- -- -- Copyright (C) 2006-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. -- -- -- -- -- -- -- -- -- -- -- -- You should have received a copy of the GNU General Public License and -- -- a copy of the GCC Runtime Library Exception along with this program; -- -- see the files COPYING3 and COPYING.RUNTIME respectively. If not, see -- -- <http://www.gnu.org/licenses/>. -- -- -- -- GNAT was originally developed by the GNAT team at New York University. -- -- Extensive contributions were provided by Ada Core Technologies Inc. -- -- -- ------------------------------------------------------------------------------ with Ada.Unchecked_Conversion; with Interfaces.C; use Interfaces.C; package body System.Memory_Move is type IA is mod System.Memory_Size; -- The type used to provide the actual desired operations function To_IA is new Ada.Unchecked_Conversion (Address, IA); -- The operations are implemented by unchecked conversion to type IA, -- followed by doing the intrinsic operation on the IA values, followed -- by converting the result back to type Address. type Byte is mod 2 ** 8; for Byte'Size use 8; -- Byte is the storage unit type Byte_Ptr is access Byte; -- Access to a byte function To_Byte_Ptr is new Ada.Unchecked_Conversion (IA, Byte_Ptr); -- Conversion between an integer address and access to byte Byte_Size : constant := 1; -- Number of storage unit in a byte type Word is mod 2 ** System.Word_Size; for Word'Size use System.Word_Size; -- Word is efficiently loaded and stored by the processor, but has -- alignment constraints. type Word_Ptr is access Word; -- Access to a word. function To_Word_Ptr is new Ada.Unchecked_Conversion (IA, Word_Ptr); -- Conversion from an integer adddress to word access Word_Size : constant := Word'Size / Storage_Unit; -- Number of storage unit per word ------------- -- memmove -- ------------- function memmove (Dest : Address; Src : Address; N : size_t) return Address is D : IA := To_IA (Dest); S : IA := To_IA (Src); C : IA := IA (N); begin -- Return immediately if no bytes to copy. if N = 0 then return Dest; end if; -- This function must handle overlapping memory regions -- for the source and destination. If the Dest buffer is -- located past the Src buffer then we use backward copying, -- and forward copying otherwise. if D > S and then D < S + C then D := D + C; S := S + C; while C /= 0 loop D := D - Byte_Size; S := S - Byte_Size; To_Byte_Ptr (D).all := To_Byte_Ptr (S).all; C := C - Byte_Size; end loop; else -- Try to copy per word, if alignment constraints are respected if ((D or S) and (Word'Alignment - 1)) = 0 then while C >= Word_Size loop To_Word_Ptr (D).all := To_Word_Ptr (S).all; D := D + Word_Size; S := S + Word_Size; C := C - Word_Size; end loop; end if; -- Copy the remaining byte per byte while C > 0 loop To_Byte_Ptr (D).all := To_Byte_Ptr (S).all; D := D + Byte_Size; S := S + Byte_Size; C := C - Byte_Size; end loop; end if; return Dest; end memmove; end System.Memory_Move;
AdaCore/gpr
Ada
2,035
adb
-- -- Copyright (C) 2019-2023, AdaCore -- -- SPDX-License-Identifier: Apache-2.0 -- with Ada.Text_IO; with Ada.Strings.Fixed; with GPR2.Context; with GPR2.Path_Name; with GPR2.Project.Attribute; with GPR2.Project.Tree; with GPR2.Project.View; with GPR2.Source; procedure Main is use Ada; use GPR2; use GPR2.Project; procedure Output_Filename (Filename : Path_Name.Full_Name); -- Remove the leading tmp directory procedure Display (Prj : Project.View.Object; Full : Boolean := True); procedure Display (Att : Project.Attribute.Object); ------------- -- Display -- ------------- procedure Display (Att : Project.Attribute.Object) is begin Text_IO.Put (" " & Image (Att.Name.Id.Attr)); if Att.Has_Index then Text_IO.Put (" (" & Att.Index.Text & ")"); end if; Text_IO.Put (" ->"); for V of Att.Values loop Text_IO.Put (" " & V.Text); end loop; Text_IO.New_Line; end Display; ------------- -- Display -- ------------- procedure Display (Prj : Project.View.Object; Full : Boolean := True) is begin Text_IO.Put ("Project: " & String (Prj.Name) & " "); Text_IO.Set_Col (20); Text_IO.Put_Line (Prj.Qualifier'Img); for Pck of Prj.Packages (With_Defaults => False) loop Text_IO.Put_Line (" " & Image (Pck)); for A of Prj.Attributes (Pack => Pck, With_Defaults => False) loop Display (A); end loop; end loop; end Display; --------------------- -- Output_Filename -- --------------------- procedure Output_Filename (Filename : Path_Name.Full_Name) is I : constant Positive := Strings.Fixed.Index (Filename, "extended/"); begin Text_IO.Put (" > " & Filename (I + 8 .. Filename'Last)); end Output_Filename; Prj : Project.Tree.Object; Ctx : Context.Object; begin Project.Tree.Load (Prj, Project.Create ("src/a.gpr"), Ctx); for P of Prj loop Display (P, Full => False); end loop; end Main;
AdaCore/libadalang
Ada
550
adb
procedure Foo is type Kind is (Bool, Int); type T (K : Kind := Bool) is record case K is when Bool => B : Boolean; when Int => I : Integer; end case; end record; function Copy (V : T) return T is (case V.K is when Bool => (V with delta B => V.B), when Int => (V with delta I => V.I)); --% node.findall(lambda n: n.text == "B")[1] --% node.findall(lambda n: n.text == "B")[1].p_referenced_decl() V1 : T := (K => Bool, B => False); V2 : T; begin V2 := Copy (V1); end Foo;
vikasbidhuri1995/DW1000
Ada
6,569
adb
------------------------------------------------------------------------------- -- Copyright (c) 2016 Daniel King -- -- 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 DW1000.Types; use DW1000.Types; package body DW1000.Ranging.Double_Sided with SPARK_Mode => On is ------------------------ -- Compute_Distance -- ------------------------ function Compute_Distance (Tag_Tx_Poll_Timestamp : in Fine_System_Time; Anchor_Rx_Poll_Timestamp : in Fine_System_Time; Anchor_Tx_Resp_Timestamp : in Fine_System_Time; Tag_Rx_Resp_Timestamp : in Fine_System_Time; Tag_Tx_Final_Timestamp : in Fine_System_Time; Anchor_Rx_Final_Timestamp : in Fine_System_Time) return Biased_Distance is Max_Time_Of_Flight : constant := 0.000_1; -- Limit the Time of Flight to a maximum of 0.000_1 seconds (100 us). -- -- This prevents overflow during the conversion from time of flight -- to distance. -- -- This limits the maximum computable distance to 2990 meters, but this -- should be plenty as the operational range of the DW1000 is about -- 10 times below this limit (300 m). type System_Time_Span_Div2 is delta System_Time_Span'Delta / 2.0 range 0.0 .. System_Time_Span'Last -- need the same range as System_Time_Span with Small => System_Time_Span'Small / 2.0; type System_Time_Span_Div4 is delta System_Time_Span'Delta / 4.0 range 0.0 .. System_Time_Span'Last / 2.0 with Small => System_Time_Span'Small / 4.0; type Large_Meters is delta Meters'Delta range 0.0 .. (Max_Time_Of_Flight / System_Time_Span_Div4'Delta) * Speed_Of_Light_In_Vacuum; -- A fixed-point type with a large enough integer part to store the -- integer representation of a System_Time_Span_Div4 value. T_Roundtrip1 : constant System_Time_Span := Calculate_Span (Start_Time => Tag_Tx_Poll_Timestamp, End_Time => Tag_Rx_Resp_Timestamp); T_Reply1 : constant System_Time_Span := Calculate_Span (Start_Time => Anchor_Rx_Poll_Timestamp, End_Time => Anchor_Tx_Resp_Timestamp); T_Roundtrip2 : constant System_Time_Span := Calculate_Span (Start_Time => Anchor_Tx_Resp_Timestamp, End_Time => Anchor_Rx_Final_Timestamp); T_Reply2 : constant System_Time_Span := Calculate_Span (Start_Time => Tag_Rx_Resp_Timestamp, End_Time => Tag_Tx_Final_Timestamp); Time_Of_Flight_1 : System_Time_Span_Div2; Time_Of_Flight_2 : System_Time_Span_Div2; Time_Of_Flight : System_Time_Span_Div4; Diff : System_Time_Span; Sum : System_Time_Span_Div2; Result : Large_Meters; begin if (T_Reply1 > T_Roundtrip1) or (T_Reply2 > T_Roundtrip2) then Time_Of_Flight := 0.0; else Diff := T_Roundtrip1 - T_Reply1; Time_Of_Flight_1 := System_Time_Span_Div2 (Diff / System_Time_Span (2.0)); Diff := T_Roundtrip2 - T_Reply2; Time_Of_Flight_2 := System_Time_Span_Div2 (Diff / System_Time_Span (2.0)); Sum := Time_Of_Flight_1 + Time_Of_Flight_2; Time_Of_Flight := System_Time_Span_Div4 (Sum / System_Time_Span_Div4 (2.0)); end if; -- Cap ToF to 0.01 seconds to avoid overflow in the following calculations. if Time_Of_Flight >= Max_Time_Of_Flight then Time_Of_Flight := Max_Time_Of_Flight; end if; pragma Assert_And_Cut (Time_Of_Flight <= Max_Time_Of_Flight); -- Convert the fixed-point representation to its integer represention -- (in multiples of the 'Delta). Result := Large_Meters (Time_Of_Flight / System_Time_Span_Div4 (System_Time_Span_Div4'Delta)); -- Multiply the ToF (s) with the speed of light (m/s) to yield -- the distance (m) in meters. Result := Result * Large_Meters (Speed_Of_Light_In_Vacuum); -- Convert back from integer representation to fixed-point representation. Result := Result / Large_Meters (1.0 / System_Time_Span_Div4'Delta); return Biased_Distance (Result); end Compute_Distance; ------------------------ -- Compute_Distance -- ------------------------ function Compute_Distance (Tag_Tx_Poll_Timestamp : in Fine_System_Time; Anchor_Rx_Poll_Timestamp : in Fine_System_Time; Anchor_Tx_Resp_Timestamp : in Fine_System_Time; Tag_Rx_Resp_Timestamp : in Fine_System_Time; Tag_Tx_Final_Timestamp : in Fine_System_Time; Anchor_Rx_Final_Timestamp : in Fine_System_Time; Channel : in DW1000.Driver.Channel_Number; PRF : in DW1000.Driver.PRF_Type) return Meters is Distance_With_Bias : Biased_Distance; begin Distance_With_Bias := Compute_Distance (Tag_Tx_Poll_Timestamp => Tag_Tx_Poll_Timestamp, Anchor_Rx_Poll_Timestamp => Anchor_Rx_Poll_Timestamp, Anchor_Tx_Resp_Timestamp => Anchor_Tx_Resp_Timestamp, Tag_Rx_Resp_Timestamp => Tag_Rx_Resp_Timestamp, Tag_Tx_Final_Timestamp => Tag_Tx_Final_Timestamp, Anchor_Rx_Final_Timestamp => Anchor_Rx_Final_Timestamp); return Remove_Ranging_Bias (Measured_Distance => Distance_With_Bias, Channel => Channel, PRF => PRF); end Compute_Distance; end DW1000.Ranging.Double_Sided;
AdaCore/training_material
Ada
28,696
adb
------------------------------------------------------------------------------ -- -- -- GNAT COMPILER COMPONENTS -- -- -- -- S Y S T E M . L I B M -- -- -- -- B o d y -- -- -- -- Copyright (C) 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 is the Ada Cert Math specific version of s-libm.adb -- When Cody and Waite implementation is cited, it refers to the -- Software Manual for the Elementary Functions by William J. Cody, Jr. -- and William Waite, published by Prentice-Hall Series in Computational -- Mathematics. Version??? ISBN??? -- When Hart implementation is cited, it refers to -- "The Computer Approximation" by John F. Hart, published by Krieger. -- Version??? ISBN??? with Numerics; use Numerics; with Libm; use Libm; with Ada.Unchecked_Conversion; with System.Machine_Code; package body Libm_Double is subtype LF is Long_Float; pragma Assert (LF'Machine_Radix = 2); pragma Assert (LF'Machine_Mantissa = 53); LF_HM : constant Integer := Long_Float'Machine_Mantissa / 2; Sqrt_Epsilon_LF : constant Long_Float := Sqrt_2 ** (1 - Long_Float'Machine_Mantissa); type Long_Float_Table is array (Positive range <>) of Long_Float; -- A1 (i) = Float (2**((1-i)/16)) A1_Tab_LF : constant Long_Float_Table := (1.0, Long_Float'Machine (Root16_Half), Long_Float'Machine (Root16_Half**2), Long_Float'Machine (Root16_Half**3), Long_Float'Machine (Root16_Half**4), Long_Float'Machine (Root16_Half**5), Long_Float'Machine (Root16_Half**6), Long_Float'Machine (Root16_Half**7), Long_Float'Machine (Root16_Half**8), Long_Float'Machine (Root16_Half**9), Long_Float'Machine (Root16_Half**10), Long_Float'Machine (Root16_Half**11), Long_Float'Machine (Root16_Half**12), Long_Float'Machine (Root16_Half**13), Long_Float'Machine (Root16_Half**14), Long_Float'Machine (Root16_Half**15), 0.5); -- A2 (i) = 2**((1-2i)/16) - A1(2i) A2_Tab_LF : constant Long_Float_Table := (Root16_Half - Long_Float'Machine (Root16_Half), Root16_Half**3 - Long_Float'Machine (Root16_Half**3), Root16_Half**5 - Long_Float'Machine (Root16_Half**5), Root16_Half**7 - Long_Float'Machine (Root16_Half**7), Root16_Half**9 - Long_Float'Machine (Root16_Half**9), Root16_Half**11 - Long_Float'Machine (Root16_Half**11), Root16_Half**13 - Long_Float'Machine (Root16_Half**13), Root16_Half**15 - Long_Float'Machine (Root16_Half**15)); -- Intermediary functions function Reconstruct_Pow (Z : Long_Float; P : Integer; M : Integer) return Long_Float; procedure Reduce_044 (X : Long_Float; Reduced_X : out Long_Float; P : out Integer) with Post => abs (Reduced_X) < 0.044; function Reduce_1_16 (X : Long_Float) return Long_Float with Post => abs (X - Reduce_1_16'Result) <= 0.0625; function Reduce_1_16 (X : Long_Float) return Long_Float is (LF'Machine_Rounding (X * 16.0) * (1.0 / 16.0)); package Long_Float_Approximations is new Generic_Approximations (Long_Float, Mantissa => 53); use Long_Float_Approximations; -- Local declarations procedure Reduce_Half_Pi_Large (X : in out LF; N : LF; Q : out Quadrant); procedure Split_Veltkamp (X : Long_Float; X_Hi, X_Lo : out Long_Float) with Post => X = X_Hi + X_Lo; function Multiply_Add (X, Y, Z : LF) return LF is (X * Y + Z); -- The following functions reduce a positive X into the range -- -ln (2) / 2 .. ln (2) / 2 -- It returns a reduced X and an integer N such that: -- X'Old = X'New + N * Log (2) -- It is used by Exp function -- The result should be correctly rounded procedure Reduce_Ln_2 (X : in out Long_Float; N : out Integer) with Pre => abs (X) <= Long_Float'Ceiling (Long_Float'Pred (709.78271_28337_79350_29149_8) * Inv_Ln_2); -- @llr Reduce_Ln_2 Long_Float -- The following is postcondition doesn't hold. Suspicious "=" ??? -- Post => abs (X) <= Ln_2 / 2.0 and -- X'Old = X + Long_Float (N) * Ln_2; -- The reduction is used by the Sin, Cos and Tan functions. procedure Reduce_Half_Pi (X : in out Long_Float; Q : out Quadrant) with Pre => X >= 0.0, Post => abs (X) <= Max_Red_Trig_Arg; -- @llr Reduce_Half_Pi Long_Float -- The following functions reduce a positive X into the range -- -(Pi/4 + E) .. Pi/4 + E, with E a small fraction of Pi. -- -- The reason the normalization is not strict is that the computation of -- the number of times to subtract half Pi is not exact. The rounding -- error is worst for large arguments, where the number of bits behind -- the radix point reduces to half the mantissa bits. -- While it would be possible to correct for this, the polynomial -- approximations work well for values slightly outside the -Pi/4 .. Pi/4 -- interval, so it is easier for both error analysis and implementation -- to leave the reduction non-strict, and assume the reduced argument is -- within -0.26 * Pi .. 0.26 * Pi rather than a quarter of pi. -- The reduction is guaranteed to be correct to within 0.501 ulp for -- values of X for which Ada's accuracy guarantees apply: -- abs X <= 2.0**(T'Machine_Mantissa / 2) -- For values outside this range, an attempt is made to have significance -- decrease only proportionally with increase of magnitued. In any case, -- for all finite arguments, the reduction will succeed, though the reduced -- value may not agree with the mathematically correct value in even its -- sign. --------------------- -- Reconstruct_Pow -- --------------------- function Reconstruct_Pow (Z : Long_Float; P : Integer; M : Integer) return Long_Float is -- Cody and Waite implementation (in "**" function page 84) -- The following computation is carried out in two steps. First add 1 to -- Z and multiply by 2**(-P/16). Then multiply the result by 2**M. Result : Long_Float; begin Result := A1_Tab_LF (P + 1) * Z; return Long_Float'Scaling (Result, M); end Reconstruct_Pow; ---------------- -- Reduce_044 -- ---------------- procedure Reduce_044 (X : Long_Float; Reduced_X : out Long_Float; P : out Integer) is -- Cody and Waite implementation (in "**" function page 84) -- The output is: -- P is the biggest odd Integer in range 1 .. 15 such that -- 2^((1-P)/16) <= X. -- Reduced_X equals 2 * (X-2^(-P/16)) / (X + 2^(-P/16)). -- abs (Reduced_X) <= max (2^(2-P/16)-2^(1-P/16)) <= 0.443. begin P := 1; if X <= A1_Tab_LF (9) then P := 9; end if; if X <= A1_Tab_LF (P + 4) then P := P + 4; end if; if X <= A1_Tab_LF (P + 2) then P := P + 2; end if; Reduced_X := (X - A1_Tab_LF (P + 1)) - A2_Tab_LF ((P + 1) / 2); Reduced_X := Reduced_X / (X + A1_Tab_LF (P + 1)); Reduced_X := Reduced_X + Reduced_X; end Reduce_044; -------------------- -- Instantiations -- -------------------- package Instantiations is function Acos is new Generic_Acos (LF); function Atan2 is new Generic_Atan2 (LF); end Instantiations; -------------------- -- Split_Veltkamp -- -------------------- procedure Split_Veltkamp (X : Long_Float; X_Hi, X_Lo : out Long_Float) is M : constant LF := 0.5 + 2.0**(1 - LF'Machine_Mantissa / 2); begin X_Hi := X * M - (X * M - X); X_Lo := X - X_Hi; end Split_Veltkamp; ----------------- -- Reduce_Ln_2 -- ----------------- procedure Reduce_Ln_2 (X : in out Long_Float; N : out Integer) is L1 : constant := Long_Float'Leading_Part (Ln_2, LF_HM); L2 : constant := Long_Float'Leading_Part (Ln_2 - L1, LF_HM); L3 : constant := Ln_2 - L2 - L1; XN : constant Long_Float := Long_Float'Rounding (X * Inv_Ln_2); begin -- The argument passed to the function is smaller than Ymax * 1/log(2) -- No overflow is possible for N (Ymax is the largest machine number -- less than Log (LF'Last)). N := Integer (XN); X := ((X - XN * L1) - XN * L2) - XN * L3; if X < -Ln_2 / 2.0 then X := X + Ln_2; N := N - 1; end if; if X > Ln_2 / 2.0 then X := X - Ln_2; N := N + 1; end if; end Reduce_Ln_2; -------------------- -- Reduce_Half_Pi -- -------------------- procedure Reduce_Half_Pi (X : in out Long_Float; Q : out Quadrant) is K : constant := Pi / 2.0; Bits_N : constant := 3; Max_N : constant := 2.0**Bits_N - 1.0; Max_X : constant LF := LF'Pred (K * Max_N); -- About 3.5 * Pi Bits_C : constant := LF'Machine_Mantissa - Bits_N; C1 : constant LF := LF'Leading_Part (K, Bits_C); C2 : constant LF := K - C1; N : constant LF := LF'Machine_Rounding (X * K**(-1)); begin if not X'Valid then X := X - X; Q := 0; elsif abs X > Max_X then Reduce_Half_Pi_Large (X, N, Q); else pragma Assert (if X'Valid then abs N <= Max_N); X := (X - N * C1) - N * C2; Q := Integer (N) mod 4; end if; end Reduce_Half_Pi; -------------------------- -- Reduce_Half_Pi_Large -- -------------------------- procedure Reduce_Half_Pi_Large (X : in out LF; N : LF; Q : out Quadrant) is type Int_64 is range -2**63 .. 2**63 - 1; -- used for conversions HM : constant Positive := LF'Machine_Mantissa / 2; C1 : constant LF := LF'Leading_Part (Half_Pi, HM); C2 : constant LF := LF'Leading_Part (Half_Pi - C1, HM); C3 : constant LF := LF'Leading_Part (Half_Pi - C1 - C2, HM); C4 : constant LF := Half_Pi - C1 - C2 - C3; K : LF := N; K_Hi : LF; K_Lo : LF; begin Q := 0; loop Split_Veltkamp (X => K, X_Hi => K_Hi, X_Lo => K_Lo); X := Multiply_Add (-K_Hi, C1, X); X := Multiply_Add (-K_Hi, C2, Multiply_Add (-K_Lo, C1, X)); X := Multiply_Add (-K_Hi, C3, Multiply_Add (-K_Lo, C2, X)); X := Multiply_Add (-K_Hi, C4, Multiply_Add (-K_Lo, C3, X)); X := Multiply_Add (-K_Lo, C4, X); if abs K < 2.0**62 then Q := Quadrant ((Int_64 (Q) + Int_64 (N)) mod 4); elsif abs K_Lo <= 2.0**62 then Q := Quadrant ((Int_64 (Q) + Int_64 (N)) mod 4); end if; exit when X in -0.26 * Pi .. 0.26 * Pi; K := LF'Machine_Rounding (X * Half_Pi**(-1)); end loop; end Reduce_Half_Pi_Large; ---------- -- Acos -- ---------- function Acos (X : LF) return LF is (Instantiations.Acos (X)); ----------- -- Acosh -- ----------- function Acosh (X : LF) return LF is -- Math based implementation using Log1p: x-> Log (1+x) T : constant LF := X - 1.0; begin if X > 1.0 / Sqrt_Epsilon_LF then return Log (X) + Ln_2; elsif X < 2.0 then return Log1p (T + Sqrt (2.0 * T + T * T)); else return Log (X + Libm_Double.Sqrt ((X - 1.0) * (X + 1.0))); end if; end Acosh; ---------- -- Asin -- ---------- function Asin (X : LF) return LF is (Long_Float_Approximations.Asin (X)); ----------- -- Asinh -- ----------- function Asinh (X : LF) return LF is -- Math based implementation using Log1p: x-> Log (1+x) Y : constant LF := abs X; G : constant LF := X * X; Res : LF; begin if Y < Sqrt_Epsilon_LF then Res := Y; elsif Y > 1.0 / Sqrt_Epsilon_LF then Res := Log (Y) + Ln_2; elsif Y < 2.0 then Res := Log1p (Y + G / (1.0 + Sqrt (G + 1.0))); else Res := Log (Y + Sqrt (G + 1.0)); end if; return LF'Copy_Sign (Res, X); end Asinh; ---------- -- Atan -- ---------- function Atan (X : LF) return LF is (Instantiations.Atan2 (X, 1.0)); ----------- -- Atan2 -- ----------- function Atan2 (Y, X : LF) return LF is (Instantiations.Atan2 (Y, X)); ----------- -- Atanh -- ----------- function Atanh (X : LF) return LF is -- Math based implementation using Log1p: x-> Log (1+x) (if X >= 0.0 then Log1p (2.0 * X / (1.0 - X)) / 2.0 else -Log1p (-2.0 * X / (1.0 + X)) / 2.0); --------- -- Cos -- --------- function Cos (X : LF) return LF is -- Math based implementation using Hart constants Y : LF := abs (X); Q : Quadrant; Result : LF; begin Reduce_Half_Pi (Y, Q); if Q mod 2 = 0 then Result := Approx_Cos (Y); else Result := Approx_Sin (Y); end if; return (if Q = 1 or else Q = 2 then -Result else Result); end Cos; ---------- -- Cosh -- ---------- function Cosh (X : LF) return LF is -- Cody and Waite implementation (page 217) Y : constant LF := abs (X); -- Because the overflow threshold for cosh(X) is beyond the overflow -- threshold for exp(X), it appears natural to reformulate the -- computation as: -- Cosh (X) = Exp (X - Log (2)) -- But because Log (2) is not an exact machine number, the finite word -- length of the machine implies that the absolute error in X - Log (2), -- hence the transmitted error in Cosh (X) is proportional to the -- magnitude of X even when X is error-free. -- To avoid this problem, we revise the computation to -- Cosh (X) = V/2 * exp(X - Log (V)) -- where Log (V) is an exact machine number slightly larger than Log (2) -- with the last few digits of its significand zero. Ln_V : constant := 8#0.542714#; -- Machine value slightly above Ln_2 V_2 : constant := 0.24999_30850_04514_99336; -- V**(-2) V_2_1 : constant := 0.13830_27787_96019_02638E-4; -- V / 2 - 1 Y_Bar : constant Long_Float := 709.78271_28933_83973_096; -- Y_Bar is the last floating point for which exp (Y) does not overflow -- and exp (-Y) does not underflow W : LF; Z : LF; begin if Y >= Y_Bar then W := Y - Ln_V; Z := Exp (W); Z := Z + V_2 / Z; return Z + V_2_1 * Z; -- rewriting of V/2 * Z else Z := Exp (Y); return (Z + 1.0 / Z) / 2.0; end if; end Cosh; --------- -- Exp -- --------- function Exp (X : LF) return LF is -- Cody and Waite implementation (page 60) N : Integer; Y : LF := X; R : LF; Ymax : constant LF := LF'Pred (709.78271_28337_79350_29149_8); -- The largest machine number less than Log (LF'Last) begin if abs (Y) < 2.0**(-LF'Machine_Mantissa - 1) then return 1.0; end if; if abs Y > Ymax then return (if Y > 0.0 then Infinity else 0.0); end if; Reduce_Ln_2 (Y, N); R := Approx_Exp (Y); return Long_Float'Scaling (R, N); end Exp; ---------- -- Exp2 -- ---------- function Exp2 (X : LF) return LF is -- Implementation based on Cody and Waite Exp implementation (page 217) -- but using Hart constants N : Integer; Y : LF := X; R : LF; Result : LF; begin if abs Y < 2.0**(-LF'Machine_Mantissa - 1) then return 1.0; end if; if abs Y > LF'Pred (LF (LF'Machine_Emax)) then return (if Y > 0.0 then Infinity else 0.0); end if; -- If X > Log(LF'Emax) ??? N := Integer (X); Y := Y - Long_Float (N); R := Approx_Exp2 (Y); Result := Long_Float'Scaling (R, N + 1); if Result /= Result then Result := (if X < LF'First then 0.0 else Infinity); end if; return Result; end Exp2; --------- -- Log -- --------- function Log (X : LF) return LF is -- Cody and Waite implementation (page 35) Exponent_X : constant Integer := LF'Exponent (X); XN : LF := LF (Exponent_X); Mantissa_X : LF := LF'Scaling (X, -Exponent_X); HM : constant Integer := LF'Machine_Mantissa / 2; L1 : constant LF := LF'Leading_Part (Ln_2, HM); L2 : constant LF := Ln_2 - L1; Result : LF; begin if X <= 0.0 then if X < 0.0 then return NaN; else return -Infinity; end if; -- Making sure X is in Sqrt (0.5) .. Sqrt (2) elsif X > Long_Float'Last then return X; elsif Mantissa_X <= Sqrt_Half then XN := XN - 1.0; Mantissa_X := Mantissa_X * 2.0; end if; Result := Approx_Log (Mantissa_X); Result := (XN * L2 + Result) + XN * L1; return Result; end Log; ----------- -- Log1p -- ----------- function Log1p (X : LF) return LF is -- Quick implementation of Log1p not accurate to the Ada regular Log -- requirements, but accurate enough to compute inverse hyperbolic -- functions. begin if 1.0 + X = 1.0 then return X; elsif X > LF'Last then return X; else return Log (1.0 + X) * (X / ((1.0 + X) - 1.0)); end if; end Log1p; ---------- -- Log2 -- ---------- function Log2 (X : LF) return LF is -- Quick implementation of Log2 not accurate to the Ada regular Log -- (base e) requirement on the whole definition interval but accurate -- enough on 0 .. 2**(-1/16). (Log (X) * (1.0 / Ln_2)); --------- -- Pow -- --------- function Pow (Left, Right : LF) return LF is -- Cody and Waite implementation (page 84) One_Over_Sixteen : constant := 0.0625; M : constant Integer := LF'Exponent (Left); G : constant LF := LF'Fraction (Left); Y : constant LF := Right; Z : LF; P : Integer; U2, U1, Y1, Y2, W1, W2, W : LF; MM, PP, IW1, I : Integer; Is_Special : Boolean; Special_Result : LF; procedure Pow_Special_Cases is new Generic_Pow_Special_Cases (LF); begin -- Special values Pow_Special_Cases (Left, Right, Is_Special, Special_Result); if Is_Special then return Special_Result; else -- Left**Right is calculated using the formula -- 2**(Right * Log2 (Left)) Reduce_044 (G, Z, P); -- At this point, Z <= 0.044 U2 := Approx_Power_Log (Z); U1 := LF (M * 16 - P) * 0.0625; -- U2 + U1 = Log2 (Left) -- Forming the pseudo extended precision product of U * Right Y1 := Reduce_1_16 (Y); Y2 := Y - Y1; W := U2 * Y + U1 * Y2; W1 := Reduce_1_16 (W); W2 := W - W1; W := W1 + U1 * Y1; W1 := Reduce_1_16 (W); W2 := W2 + (W - W1); W := Reduce_1_16 (W2); IW1 := Integer (16.0 * (W1 + W)); W2 := W2 - W; if W2 > 0.0 then W2 := W2 - One_Over_Sixteen; IW1 := 1 + IW1; end if; if IW1 < 0 then I := 0; else I := 1; end if; MM := Integer (IW1 / 16) + I; PP := 16 * MM - IW1; Z := Approx_Exp2 (W2); return Reconstruct_Pow (Z, PP, MM); end if; end Pow; --------- -- Sin -- --------- function Sin (X : LF) return LF is -- Math based implementation using Hart constants Y : LF := abs X; Q : Quadrant; Result : LF; begin Reduce_Half_Pi (Y, Q); if Q mod 2 = 0 then Result := Approx_Sin (Y); else Result := Approx_Cos (Y); end if; return LF'Copy_Sign (1.0, X) * (if Q >= 2 then -Result else Result); end Sin; ---------- -- Sinh -- ---------- function Sinh (X : LF) return LF is -- Cody and Waite implementation (page 217) Sign : constant LF := LF'Copy_Sign (1.0, X); Y : constant LF := abs X; -- Because the overflow threshold for sinh(X) is beyond the overflow -- threshold for exp(X), it appears natural to reformulate the -- computation as: -- Sinh (X) = Exp (X - Log (2)) -- But because Log (2) is not an exact machine number, the finite word -- length of the machine implies that the absolute error in X - Log (2), -- hence the transmitted error in Sinh (X) is proportional to the -- magnitude of X even when X is error-free. To avoid this problem, we -- revise the computation to: -- Sinh (X) = V/2 * exp(X - Log (V)) -- where Log (V) is an exact machine number slightly larger than Log (2) -- with the last few digits of its significand zero. Ln_V : constant := 8#0.542714#; -- Machine value slightly above Ln_2 V_2 : constant := 0.24999_30850_04514_99336; -- V**(-2) V_2_1 : constant := 0.13830_27787_96019_02638E-4; -- V / 2 - 1 Y_Bar : constant Long_Float := 709.78271_28933_83973_096; -- The last floating point for which exp (X) does not overflow and -- exp (-x) does not underflow W : LF; Z : LF; begin if Y <= 1.0 then return Approx_Sinh (X); end if; if Y >= Y_Bar then W := Y - Ln_V; Z := Exp (W); Z := Z - V_2 / Z; return Sign * (Z + V_2_1 * Z); -- rewriting of V/2 * Z else Z := Exp (Y); return Sign * ((Z - 1.0 / Z) / 2.0); end if; end Sinh; --------- -- Tan -- --------- function Tan (X : LF) return LF is -- Math based implementation using Hart constants Y : LF := abs X; N : Integer; begin if abs X < LF'Last then Reduce_Half_Pi (Y, N); else return Infinity / Infinity; end if; -- The reconstruction is included in the algebraic fraction in -- Approx_Tan function. if N mod 2 = 0 then return Approx_Tan (Y) * LF'Copy_Sign (1.0, X); else return Approx_Cot (Y) * LF'Copy_Sign (1.0, X); end if; end Tan; ---------- -- Tanh -- ---------- function Tanh (X : LF) return LF is -- Cody and Waite implementation (page 239) F : constant LF := abs (X); Xbig : constant := Ln_2 * LF (1 + LF'Machine_Mantissa); LN_3_2 : constant := 0.54930_61443_34054_84570; Result : LF; begin if F > Xbig then Result := 1.0; else if F > LN_3_2 then Result := 1.0 - 2.0 / (Exp (2.0 * F) + 1.0); else Result := Approx_Tanh (F); end if; end if; return LF'Copy_Sign (Result, X); end Tanh; function Rsqrt (X : Long_Float) return Long_Float; -- Compute the reciprocal square root. There are two reasons for computing -- the reciprocal square root instead of computing directly the square -- root: PowerPc provides an instruction (fsqrte) to compute an estimate of -- the reciprocal (with 5 bits of precision), and the Newton-Raphson method -- is more efficient on the reciprocal than on the direct root (because the -- direct root needs divisions, while the reciprocal does not). Note that -- PowerPc core e300 doesn't support the direct square root operation. ----------- -- Rsqrt -- ----------- function Rsqrt (X : Long_Float) return Long_Float is X_Half : constant Long_Float := X * 0.5; Y : Long_Float; begin if Standard'Target_Name = "powerpc-elf" then -- On powerpc, the precision of fsqrte is at least 5 binary digits System.Machine_Code.Asm ("frsqrte %0,%1", Outputs => Long_Float'Asm_Output ("=f", Y), Inputs => Long_Float'Asm_Input ("f", X)); else -- Provide the exact result for 1.0 if X = 1.0 then return X; end if; -- Use the method described in Fast Inverse Square Root article by -- Chris Lomont (http://www.lomont.org/Math/Papers/2003/InvSqrt.pdf), -- although the code was known before that article. declare type Unsigned_Long is mod 2**64; function To_Unsigned_Long is new Ada.Unchecked_Conversion (Long_Float, Unsigned_Long); function From_Unsigned_Long is new Ada.Unchecked_Conversion (Unsigned_Long, Long_Float); U : Unsigned_Long; begin U := To_Unsigned_Long (X); U := 16#5fe6ec85_e7de30da# - (U / 2); Y := From_Unsigned_Long (U); -- Precision is about 4 digits end; end if; -- Newton iterations: X <- X - F(X)/F'(X) -- Here F(X) = 1/X^2 - A, so F'(X) = -2/X^3 -- So: X <- X - (1/X^2 - A) / (-2/X^3) -- <- X + .5(X - A*X^3) -- <- X + .5*X*(1 - A*X^2) -- <- X (1 + .5 - .5*A*X^2) -- <- X(1.5 - .5*A*X^2) -- Precision is doubled at each iteration. -- Refine: 10 digits (PowerPc) or 8 digits (fast method) Y := Y * (1.5 - X_Half * Y * Y); -- Refine: 20 digits (PowerPc) or 16 digits (fast method) Y := Y * (1.5 - X_Half * Y * Y); -- Refine: 40 digits (PowerPc) or 32 digits (fast method) Y := Y * (1.5 - X_Half * Y * Y); -- Refine (beyond the precision of Long_Float) Y := Y * (1.5 - X_Half * Y * Y); return Y; end Rsqrt; ---------- -- Sqrt -- ---------- function Sqrt (X : Long_Float) return Long_Float is begin if X <= 0.0 then if X = 0.0 then return X; else return NaN; end if; elsif X = Infinity then return X; else return X * Rsqrt (X); end if; end Sqrt; end Libm_Double;
zhmu/ananas
Ada
17,721
adb
------------------------------------------------------------------------------ -- -- -- GNAT RUN-TIME COMPONENTS -- -- -- -- ADA.NUMERICS.BIG_NUMBERS.BIG_INTEGERS -- -- -- -- B o d y -- -- -- -- Copyright (C) 2019-2022, Free Software Foundation, Inc. -- -- -- -- GNAT is free software; you can redistribute it and/or modify it under -- -- terms of the GNU General Public License as published by the Free Soft- -- -- ware Foundation; either version 3, or (at your option) any later ver- -- -- sion. GNAT is distributed in the hope that it will be useful, but WITH- -- -- OUT ANY WARRANTY; without even the implied warranty of MERCHANTABILITY -- -- or FITNESS FOR A PARTICULAR PURPOSE. -- -- -- -- As a special exception under Section 7 of GPL version 3, you are granted -- -- additional permissions described in the GCC Runtime Library Exception, -- -- version 3.1, as published by the Free Software Foundation. -- -- -- -- You should have received a copy of the GNU General Public License and -- -- a copy of the GCC Runtime Library Exception along with this program; -- -- see the files COPYING3 and COPYING.RUNTIME respectively. If not, see -- -- <http://www.gnu.org/licenses/>. -- -- -- -- GNAT was originally developed by the GNAT team at New York University. -- -- Extensive contributions were provided by Ada Core Technologies Inc. -- -- -- ------------------------------------------------------------------------------ with Ada.Unchecked_Deallocation; with Interfaces; use Interfaces; with System.Generic_Bignums; with System.Shared_Bignums; use System.Shared_Bignums; package body Ada.Numerics.Big_Numbers.Big_Integers is function Allocate_Bignum (D : Digit_Vector; Neg : Boolean) return Bignum; -- Allocate Bignum value with the given contents procedure Free_Bignum (X : in out Bignum); -- Free memory associated with X function To_Bignum (X : aliased in out Bignum) return Bignum is (X); procedure Free is new Ada.Unchecked_Deallocation (Bignum_Data, Bignum); --------------------- -- Allocate_Bignum -- --------------------- function Allocate_Bignum (D : Digit_Vector; Neg : Boolean) return Bignum is begin return new Bignum_Data'(D'Length, Neg, D); end Allocate_Bignum; ----------------- -- Free_Bignum -- ----------------- procedure Free_Bignum (X : in out Bignum) is begin Free (X); end Free_Bignum; package Bignums is new System.Generic_Bignums (Bignum, Allocate_Bignum, Free_Bignum, To_Bignum); use Bignums, System; function Get_Bignum (Arg : Big_Integer) return Bignum is (if Arg.Value.C = System.Null_Address then raise Constraint_Error with "invalid big integer" else To_Bignum (Arg.Value.C)); -- Check for validity of Arg and return the Bignum value stored in Arg. -- Raise Constraint_Error if Arg is uninitialized. procedure Set_Bignum (Arg : out Big_Integer; Value : Bignum) with Inline; -- Set the Bignum value stored in Arg to Value ---------------- -- Set_Bignum -- ---------------- procedure Set_Bignum (Arg : out Big_Integer; Value : Bignum) is begin Arg.Value.C := To_Address (Value); end Set_Bignum; -------------- -- Is_Valid -- -------------- function Is_Valid (Arg : Big_Integer) return Boolean is (Arg.Value.C /= System.Null_Address); --------- -- "=" -- --------- function "=" (L, R : Valid_Big_Integer) return Boolean is begin return Big_EQ (Get_Bignum (L), Get_Bignum (R)); end "="; --------- -- "<" -- --------- function "<" (L, R : Valid_Big_Integer) return Boolean is begin return Big_LT (Get_Bignum (L), Get_Bignum (R)); end "<"; ---------- -- "<=" -- ---------- function "<=" (L, R : Valid_Big_Integer) return Boolean is begin return Big_LE (Get_Bignum (L), Get_Bignum (R)); end "<="; --------- -- ">" -- --------- function ">" (L, R : Valid_Big_Integer) return Boolean is begin return Big_GT (Get_Bignum (L), Get_Bignum (R)); end ">"; ---------- -- ">=" -- ---------- function ">=" (L, R : Valid_Big_Integer) return Boolean is begin return Big_GE (Get_Bignum (L), Get_Bignum (R)); end ">="; -------------------- -- To_Big_Integer -- -------------------- function To_Big_Integer (Arg : Integer) return Valid_Big_Integer is Result : Big_Integer; begin Set_Bignum (Result, To_Bignum (Long_Long_Integer (Arg))); return Result; end To_Big_Integer; ---------------- -- To_Integer -- ---------------- function To_Integer (Arg : Valid_Big_Integer) return Integer is begin return Integer (From_Bignum (Get_Bignum (Arg))); end To_Integer; ------------------------ -- Signed_Conversions -- ------------------------ package body Signed_Conversions is -------------------- -- To_Big_Integer -- -------------------- function To_Big_Integer (Arg : Int) return Valid_Big_Integer is Result : Big_Integer; begin Set_Bignum (Result, To_Bignum (Long_Long_Long_Integer (Arg))); return Result; end To_Big_Integer; ---------------------- -- From_Big_Integer -- ---------------------- function From_Big_Integer (Arg : Valid_Big_Integer) return Int is begin return Int (From_Bignum (Get_Bignum (Arg))); end From_Big_Integer; end Signed_Conversions; -------------------------- -- Unsigned_Conversions -- -------------------------- package body Unsigned_Conversions is -------------------- -- To_Big_Integer -- -------------------- function To_Big_Integer (Arg : Int) return Valid_Big_Integer is Result : Big_Integer; begin Set_Bignum (Result, To_Bignum (Unsigned_128 (Arg))); return Result; end To_Big_Integer; ---------------------- -- From_Big_Integer -- ---------------------- function From_Big_Integer (Arg : Valid_Big_Integer) return Int is begin return Int (From_Bignum (Get_Bignum (Arg))); end From_Big_Integer; end Unsigned_Conversions; --------------- -- To_String -- --------------- function To_String (Arg : Valid_Big_Integer; Width : Field := 0; Base : Number_Base := 10) return String is begin return To_String (Get_Bignum (Arg), Natural (Width), Positive (Base)); end To_String; ----------------- -- From_String -- ----------------- function From_String (Arg : String) return Valid_Big_Integer is procedure Scan_Decimal (Arg : String; J : in out Natural; Result : out Big_Integer); -- Scan decimal value starting at Arg (J). Store value in Result if -- successful, raise Constraint_Error if not. On exit, J points to the -- first index past the decimal value. ------------------ -- Scan_Decimal -- ------------------ procedure Scan_Decimal (Arg : String; J : in out Natural; Result : out Big_Integer) is Initial_J : constant Natural := J; Ten : constant Big_Integer := To_Big_Integer (10); begin Result := To_Big_Integer (0); while J <= Arg'Last loop if Arg (J) in '0' .. '9' then Result := Result * Ten + To_Big_Integer (Character'Pos (Arg (J)) - Character'Pos ('0')); elsif Arg (J) = '_' then if J in Initial_J | Arg'Last or else Arg (J - 1) not in '0' .. '9' or else Arg (J + 1) not in '0' .. '9' then raise Constraint_Error with "invalid integer value: " & Arg; end if; else exit; end if; J := J + 1; end loop; end Scan_Decimal; Result : Big_Integer; begin -- First try the fast path via Long_Long_Long_Integer'Value Set_Bignum (Result, To_Bignum (Long_Long_Long_Integer'Value (Arg))); return Result; exception when Constraint_Error => -- Then try the slow path declare Neg : Boolean := False; Base_Found : Boolean := False; Base_Int : Positive := 10; J : Natural := Arg'First; Val : Natural; Base : Big_Integer; Exp : Big_Integer; begin -- Scan past leading blanks while J <= Arg'Last and then Arg (J) = ' ' loop J := J + 1; end loop; if J > Arg'Last then raise; end if; -- Scan and store negative sign if found if Arg (J) = '-' then Neg := True; J := J + 1; end if; -- Scan decimal value: either the result itself, or the base -- value if followed by a '#'. Scan_Decimal (Arg, J, Result); -- Scan explicit base if requested if J <= Arg'Last and then Arg (J) = '#' then Base_Int := To_Integer (Result); if Base_Int not in 2 .. 16 then raise; end if; Base_Found := True; Base := Result; Result := To_Big_Integer (0); J := J + 1; while J <= Arg'Last loop case Arg (J) is when '0' .. '9' => Val := Character'Pos (Arg (J)) - Character'Pos ('0'); if Val >= Base_Int then raise; end if; Result := Result * Base + To_Big_Integer (Val); when 'a' .. 'f' => Val := 10 + Character'Pos (Arg (J)) - Character'Pos ('a'); if Val >= Base_Int then raise; end if; Result := Result * Base + To_Big_Integer (Val); when 'A' .. 'F' => Val := 10 + Character'Pos (Arg (J)) - Character'Pos ('A'); if Val >= Base_Int then raise; end if; Result := Result * Base + To_Big_Integer (Val); when '_' => -- We only allow _ preceded and followed by a valid -- number and not any other character. if J in Arg'First | Arg'Last or else Arg (J - 1) in '_' | '#' or else Arg (J + 1) = '#' then raise; end if; when '#' => J := J + 1; exit; when others => raise; end case; J := J + 1; end loop; else Base := To_Big_Integer (10); end if; if Base_Found and then Arg (J - 1) /= '#' then raise; end if; if J <= Arg'Last then -- Scan exponent if Arg (J) in 'e' | 'E' then J := J + 1; if Arg (J) = '+' then J := J + 1; end if; Scan_Decimal (Arg, J, Exp); Result := Result * (Base ** To_Integer (Exp)); end if; -- Scan past trailing blanks while J <= Arg'Last and then Arg (J) = ' ' loop J := J + 1; end loop; if J <= Arg'Last then raise; end if; end if; if Neg then return -Result; else return Result; end if; end; end From_String; --------------- -- Put_Image -- --------------- procedure Put_Image (S : in out Root_Buffer_Type'Class; V : Big_Integer) is -- This is implemented in terms of To_String. It might be more elegant -- and more efficient to do it the other way around, but this is the -- most expedient implementation for now. begin Strings.Text_Buffers.Put_UTF_8 (S, To_String (V)); end Put_Image; --------- -- "+" -- --------- function "+" (L : Valid_Big_Integer) return Valid_Big_Integer is Result : Big_Integer; begin Set_Bignum (Result, new Bignum_Data'(Get_Bignum (L).all)); return Result; end "+"; --------- -- "-" -- --------- function "-" (L : Valid_Big_Integer) return Valid_Big_Integer is Result : Big_Integer; begin Set_Bignum (Result, Big_Neg (Get_Bignum (L))); return Result; end "-"; ----------- -- "abs" -- ----------- function "abs" (L : Valid_Big_Integer) return Valid_Big_Integer is Result : Big_Integer; begin Set_Bignum (Result, Big_Abs (Get_Bignum (L))); return Result; end "abs"; --------- -- "+" -- --------- function "+" (L, R : Valid_Big_Integer) return Valid_Big_Integer is Result : Big_Integer; begin Set_Bignum (Result, Big_Add (Get_Bignum (L), Get_Bignum (R))); return Result; end "+"; --------- -- "-" -- --------- function "-" (L, R : Valid_Big_Integer) return Valid_Big_Integer is Result : Big_Integer; begin Set_Bignum (Result, Big_Sub (Get_Bignum (L), Get_Bignum (R))); return Result; end "-"; --------- -- "*" -- --------- function "*" (L, R : Valid_Big_Integer) return Valid_Big_Integer is Result : Big_Integer; begin Set_Bignum (Result, Big_Mul (Get_Bignum (L), Get_Bignum (R))); return Result; end "*"; --------- -- "/" -- --------- function "/" (L, R : Valid_Big_Integer) return Valid_Big_Integer is Result : Big_Integer; begin Set_Bignum (Result, Big_Div (Get_Bignum (L), Get_Bignum (R))); return Result; end "/"; ----------- -- "mod" -- ----------- function "mod" (L, R : Valid_Big_Integer) return Valid_Big_Integer is Result : Big_Integer; begin Set_Bignum (Result, Big_Mod (Get_Bignum (L), Get_Bignum (R))); return Result; end "mod"; ----------- -- "rem" -- ----------- function "rem" (L, R : Valid_Big_Integer) return Valid_Big_Integer is Result : Big_Integer; begin Set_Bignum (Result, Big_Rem (Get_Bignum (L), Get_Bignum (R))); return Result; end "rem"; ---------- -- "**" -- ---------- function "**" (L : Valid_Big_Integer; R : Natural) return Valid_Big_Integer is begin declare Exp : Bignum := To_Bignum (Long_Long_Integer (R)); Result : Big_Integer; begin Set_Bignum (Result, Big_Exp (Get_Bignum (L), Exp)); Free (Exp); return Result; end; end "**"; --------- -- Min -- --------- function Min (L, R : Valid_Big_Integer) return Valid_Big_Integer is (if L < R then L else R); --------- -- Max -- --------- function Max (L, R : Valid_Big_Integer) return Valid_Big_Integer is (if L > R then L else R); ----------------------------- -- Greatest_Common_Divisor -- ----------------------------- function Greatest_Common_Divisor (L, R : Valid_Big_Integer) return Big_Positive is function GCD (A, B : Big_Integer) return Big_Integer; -- Recursive internal version --------- -- GCD -- --------- function GCD (A, B : Big_Integer) return Big_Integer is begin if Is_Zero (Get_Bignum (B)) then return A; else return GCD (B, A rem B); end if; end GCD; begin return GCD (abs L, abs R); end Greatest_Common_Divisor; ------------ -- Adjust -- ------------ procedure Adjust (This : in out Controlled_Bignum) is begin if This.C /= System.Null_Address then This.C := To_Address (new Bignum_Data'(To_Bignum (This.C).all)); end if; end Adjust; -------------- -- Finalize -- -------------- procedure Finalize (This : in out Controlled_Bignum) is Tmp : Bignum := To_Bignum (This.C); begin Free (Tmp); This.C := System.Null_Address; end Finalize; end Ada.Numerics.Big_Numbers.Big_Integers;
optikos/oasis
Ada
5,325
adb
-- Copyright (c) 2019 Maxim Reznik <[email protected]> -- -- SPDX-License-Identifier: MIT -- License-Filename: LICENSE ------------------------------------------------------------- package body Program.Nodes.With_Clauses is function Create (Limited_Token : Program.Lexical_Elements.Lexical_Element_Access; Private_Token : Program.Lexical_Elements.Lexical_Element_Access; With_Token : not null Program.Lexical_Elements .Lexical_Element_Access; Clause_Names : not null Program.Elements.Expressions .Expression_Vector_Access; Semicolon_Token : not null Program.Lexical_Elements .Lexical_Element_Access) return With_Clause is begin return Result : With_Clause := (Limited_Token => Limited_Token, Private_Token => Private_Token, With_Token => With_Token, Clause_Names => Clause_Names, Semicolon_Token => Semicolon_Token, Enclosing_Element => null) do Initialize (Result); end return; end Create; function Create (Clause_Names : not null Program.Elements.Expressions .Expression_Vector_Access; Is_Part_Of_Implicit : Boolean := False; Is_Part_Of_Inherited : Boolean := False; Is_Part_Of_Instance : Boolean := False; Has_Limited : Boolean := False; Has_Private : Boolean := False) return Implicit_With_Clause is begin return Result : Implicit_With_Clause := (Clause_Names => Clause_Names, Is_Part_Of_Implicit => Is_Part_Of_Implicit, Is_Part_Of_Inherited => Is_Part_Of_Inherited, Is_Part_Of_Instance => Is_Part_Of_Instance, Has_Limited => Has_Limited, Has_Private => Has_Private, Enclosing_Element => null) do Initialize (Result); end return; end Create; overriding function Clause_Names (Self : Base_With_Clause) return not null Program.Elements.Expressions.Expression_Vector_Access is begin return Self.Clause_Names; end Clause_Names; overriding function Limited_Token (Self : With_Clause) return Program.Lexical_Elements.Lexical_Element_Access is begin return Self.Limited_Token; end Limited_Token; overriding function Private_Token (Self : With_Clause) return Program.Lexical_Elements.Lexical_Element_Access is begin return Self.Private_Token; end Private_Token; overriding function With_Token (Self : With_Clause) return not null Program.Lexical_Elements.Lexical_Element_Access is begin return Self.With_Token; end With_Token; overriding function Semicolon_Token (Self : With_Clause) return not null Program.Lexical_Elements.Lexical_Element_Access is begin return Self.Semicolon_Token; end Semicolon_Token; overriding function Has_Limited (Self : With_Clause) return Boolean is begin return Self.Limited_Token.Assigned; end Has_Limited; overriding function Has_Private (Self : With_Clause) return Boolean is begin return Self.Private_Token.Assigned; end Has_Private; overriding function Is_Part_Of_Implicit (Self : Implicit_With_Clause) return Boolean is begin return Self.Is_Part_Of_Implicit; end Is_Part_Of_Implicit; overriding function Is_Part_Of_Inherited (Self : Implicit_With_Clause) return Boolean is begin return Self.Is_Part_Of_Inherited; end Is_Part_Of_Inherited; overriding function Is_Part_Of_Instance (Self : Implicit_With_Clause) return Boolean is begin return Self.Is_Part_Of_Instance; end Is_Part_Of_Instance; overriding function Has_Limited (Self : Implicit_With_Clause) return Boolean is begin return Self.Has_Limited; end Has_Limited; overriding function Has_Private (Self : Implicit_With_Clause) return Boolean is begin return Self.Has_Private; end Has_Private; procedure Initialize (Self : aliased in out Base_With_Clause'Class) is begin for Item in Self.Clause_Names.Each_Element loop Set_Enclosing_Element (Item.Element, Self'Unchecked_Access); end loop; null; end Initialize; overriding function Is_With_Clause_Element (Self : Base_With_Clause) return Boolean is pragma Unreferenced (Self); begin return True; end Is_With_Clause_Element; overriding function Is_Clause_Element (Self : Base_With_Clause) return Boolean is pragma Unreferenced (Self); begin return True; end Is_Clause_Element; overriding procedure Visit (Self : not null access Base_With_Clause; Visitor : in out Program.Element_Visitors.Element_Visitor'Class) is begin Visitor.With_Clause (Self); end Visit; overriding function To_With_Clause_Text (Self : aliased in out With_Clause) return Program.Elements.With_Clauses.With_Clause_Text_Access is begin return Self'Unchecked_Access; end To_With_Clause_Text; overriding function To_With_Clause_Text (Self : aliased in out Implicit_With_Clause) return Program.Elements.With_Clauses.With_Clause_Text_Access is pragma Unreferenced (Self); begin return null; end To_With_Clause_Text; end Program.Nodes.With_Clauses;
DrenfongWong/tkm-rpc
Ada
2,097
adb
-- -- Copyright (C) 2013 Reto Buerki <[email protected]> -- Copyright (C) 2013 Adrian-Ken Rueegsegger <[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: -- 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 University 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 REGENTS 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 REGENTS 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. -- separate (Tkmrpc.Clients.Ike) procedure Init (Result : out Results.Result_Type; Address : Interfaces.C.Strings.chars_ptr) is begin declare Socket_Address : constant String := Interfaces.C.Strings.Value (Item => Address); begin Transport.Client.Connect (Address => Socket_Address); Result := Results.Ok; end; exception when others => Result := Results.Invalid_Operation; end Init;
reznikmm/matreshka
Ada
11,326
ads
------------------------------------------------------------------------------ -- -- -- Matreshka Project -- -- -- -- Ada Modeling Framework -- -- -- -- Runtime Library Component -- -- -- ------------------------------------------------------------------------------ -- -- -- Copyright © 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$ ------------------------------------------------------------------------------ -- This file is generated, don't edit it. ------------------------------------------------------------------------------ -- A classifier is a classification of instances - it describes a set of -- instances that have features in common. A classifier can specify a -- generalization hierarchy by referencing its general classifiers. ------------------------------------------------------------------------------ limited with AMF.CMOF.Classifiers.Collections; limited with AMF.CMOF.Features.Collections; limited with AMF.CMOF.Named_Elements.Collections; with AMF.CMOF.Namespaces; limited with AMF.CMOF.Properties.Collections; with AMF.CMOF.Types; package AMF.CMOF.Classifiers is pragma Preelaborate; type CMOF_Classifier is limited interface and AMF.CMOF.Namespaces.CMOF_Namespace and AMF.CMOF.Types.CMOF_Type; type CMOF_Classifier_Access is access all CMOF_Classifier'Class; for CMOF_Classifier_Access'Storage_Size use 0; not overriding function Get_Attribute (Self : not null access constant CMOF_Classifier) return AMF.CMOF.Properties.Collections.Set_Of_CMOF_Property is abstract; -- Getter of Classifier::attribute. -- -- Refers to all of the Properties that are direct (i.e. not inherited or -- imported) attributes of the classifier. not overriding function Get_Feature (Self : not null access constant CMOF_Classifier) return AMF.CMOF.Features.Collections.Set_Of_CMOF_Feature is abstract; -- Getter of Classifier::feature. -- -- 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. not overriding function Get_General (Self : not null access constant CMOF_Classifier) return AMF.CMOF.Classifiers.Collections.Set_Of_CMOF_Classifier is abstract; -- Getter of Classifier::general. -- -- References the general classifier in the Generalization relationship. not overriding function Get_Inherited_Member (Self : not null access constant CMOF_Classifier) return AMF.CMOF.Named_Elements.Collections.Set_Of_CMOF_Named_Element is abstract; -- Getter of Classifier::inheritedMember. -- -- Specifies all elements inherited by this classifier from the general -- classifiers. not overriding function Get_Is_Final_Specialization (Self : not null access constant CMOF_Classifier) return Boolean is abstract; -- 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. not overriding procedure Set_Is_Final_Specialization (Self : not null access CMOF_Classifier; To : Boolean) is abstract; -- 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. not overriding function Conforms_To (Self : not null access constant CMOF_Classifier; Other : AMF.CMOF.Classifiers.CMOF_Classifier_Access) return Boolean is abstract; -- 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. not overriding function All_Features (Self : not null access constant CMOF_Classifier) return AMF.CMOF.Features.Collections.Set_Of_CMOF_Feature is abstract; -- 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. not overriding function General (Self : not null access constant CMOF_Classifier) return AMF.CMOF.Classifiers.Collections.Set_Of_CMOF_Classifier is abstract; -- Operation Classifier::general. -- -- The general classifiers are the classifiers referenced by the -- generalization relationships. not overriding function Parents (Self : not null access constant CMOF_Classifier) return AMF.CMOF.Classifiers.Collections.Set_Of_CMOF_Classifier is abstract; -- Operation Classifier::parents. -- -- The query parents() gives all of the immediate ancestors of a -- generalized Classifier. not overriding function Inherited_Member (Self : not null access constant CMOF_Classifier) return AMF.CMOF.Named_Elements.Collections.Set_Of_CMOF_Named_Element is abstract; -- Operation Classifier::inheritedMember. -- -- The inheritedMember association is derived by inheriting the -- inheritable members of the parents. not overriding function All_Parents (Self : not null access constant CMOF_Classifier) return AMF.CMOF.Classifiers.Collections.Set_Of_CMOF_Classifier is abstract; -- Operation Classifier::allParents. -- -- The query allParents() gives all of the direct and indirect ancestors -- of a generalized Classifier. not overriding function Inheritable_Members (Self : not null access constant CMOF_Classifier; C : AMF.CMOF.Classifiers.CMOF_Classifier_Access) return AMF.CMOF.Named_Elements.Collections.Set_Of_CMOF_Named_Element is abstract; -- 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. not overriding function Has_Visibility_Of (Self : not null access constant CMOF_Classifier; N : AMF.CMOF.Named_Elements.CMOF_Named_Element_Access) return Boolean is abstract; -- 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. not overriding function Inherit (Self : not null access constant CMOF_Classifier; Inhs : AMF.CMOF.Named_Elements.Collections.Set_Of_CMOF_Named_Element) return AMF.CMOF.Named_Elements.Collections.Set_Of_CMOF_Named_Element is abstract; -- Operation Classifier::inherit. -- -- The inherit operation is overridden to exclude redefined properties. not overriding function May_Specialize_Type (Self : not null access constant CMOF_Classifier; C : AMF.CMOF.Classifiers.CMOF_Classifier_Access) return Boolean is abstract; -- 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. end AMF.CMOF.Classifiers;
reznikmm/matreshka
Ada
4,097
ads
------------------------------------------------------------------------------ -- -- -- Matreshka Project -- -- -- -- Open Document Toolkit -- -- -- -- Runtime Library Component -- -- -- ------------------------------------------------------------------------------ -- -- -- Copyright © 2014, Vadim Godunko <[email protected]> -- -- All rights reserved. -- -- -- -- Redistribution and use in source and binary forms, with or without -- -- modification, are permitted provided that the following conditions -- -- are met: -- -- -- -- * Redistributions of source code must retain the above copyright -- -- notice, this list of conditions and the following disclaimer. -- -- -- -- * Redistributions in binary form must reproduce the above copyright -- -- notice, this list of conditions and the following disclaimer in the -- -- documentation and/or other materials provided with the distribution. -- -- -- -- * Neither the name of the Vadim Godunko, IE nor the names of its -- -- contributors may be used to endorse or promote products derived from -- -- this software without specific prior written permission. -- -- -- -- THIS SOFTWARE IS PROVIDED BY THE COPYRIGHT HOLDERS AND CONTRIBUTORS -- -- "AS IS" AND ANY EXPRESS OR IMPLIED WARRANTIES, INCLUDING, BUT NOT -- -- LIMITED TO, THE IMPLIED WARRANTIES OF MERCHANTABILITY AND FITNESS FOR -- -- A PARTICULAR PURPOSE ARE DISCLAIMED. IN NO EVENT SHALL THE COPYRIGHT -- -- HOLDER OR CONTRIBUTORS BE LIABLE FOR ANY DIRECT, INDIRECT, INCIDENTAL, -- -- SPECIAL, EXEMPLARY, OR CONSEQUENTIAL DAMAGES (INCLUDING, BUT NOT LIMITED -- -- TO, PROCUREMENT OF SUBSTITUTE GOODS OR SERVICES; LOSS OF USE, DATA, OR -- -- PROFITS; OR BUSINESS INTERRUPTION) HOWEVER CAUSED AND ON ANY THEORY OF -- -- LIABILITY, WHETHER IN CONTRACT, STRICT LIABILITY, OR TORT (INCLUDING -- -- NEGLIGENCE OR OTHERWISE) ARISING IN ANY WAY OUT OF THE USE OF THIS -- -- SOFTWARE, EVEN IF ADVISED OF THE POSSIBILITY OF SUCH DAMAGE. -- -- -- ------------------------------------------------------------------------------ -- $Revision$ $Date$ ------------------------------------------------------------------------------ with ODF.DOM.Text_List_Tab_Stop_Position_Attributes; package Matreshka.ODF_Text.List_Tab_Stop_Position_Attributes is type Text_List_Tab_Stop_Position_Attribute_Node is new Matreshka.ODF_Text.Abstract_Text_Attribute_Node and ODF.DOM.Text_List_Tab_Stop_Position_Attributes.ODF_Text_List_Tab_Stop_Position_Attribute with null record; overriding function Create (Parameters : not null access Matreshka.DOM_Attributes.Attribute_L2_Parameters) return Text_List_Tab_Stop_Position_Attribute_Node; overriding function Get_Local_Name (Self : not null access constant Text_List_Tab_Stop_Position_Attribute_Node) return League.Strings.Universal_String; end Matreshka.ODF_Text.List_Tab_Stop_Position_Attributes;
adammw/rtp_labs
Ada
187
adb
with Ada.Text_Io; use Ada.Text_Io; procedure Mod_Ints is begin for I in Integer range 0 .. 100 loop if I mod 3 = 0 then Put_Line(I'img); end if; end loop; end Mod_Ints;
AdaCore/libadalang
Ada
284
ads
package T is task Tsk is entry B; end Tsk; --% node.p_next_part_for_decl() --% node.p_next_part_for_decl().p_next_part_for_decl() --% node.p_next_part_for_decl().p_next_part_for_decl().p_previous_part() --% node.p_next_part_for_decl().p_previous_part() end T;
fnarenji/BoiteMaker
Ada
512
ads
with ada.strings.unbounded; use ada.strings.unbounded; with ada.text_io; use ada.text_io; package text_file is -- Ecriture une chaîne dans un fichier procedure write_string_to_file(file_path, content : string); -- Lire le fichier dans la chaîne procedure read_file_to_string(file_path : string; content : out unbounded_string); -- Lire le fichier (handle) dans la chaîne procedure read_file_to_string(file_handle : in out file_type; content : out unbounded_string); end text_file;
reznikmm/matreshka
Ada
4,703
adb
------------------------------------------------------------------------------ -- -- -- Matreshka Project -- -- -- -- Open Document Toolkit -- -- -- -- Runtime Library Component -- -- -- ------------------------------------------------------------------------------ -- -- -- Copyright © 2014, Vadim Godunko <[email protected]> -- -- All rights reserved. -- -- -- -- Redistribution and use in source and binary forms, with or without -- -- modification, are permitted provided that the following conditions -- -- are met: -- -- -- -- * Redistributions of source code must retain the above copyright -- -- notice, this list of conditions and the following disclaimer. -- -- -- -- * Redistributions in binary form must reproduce the above copyright -- -- notice, this list of conditions and the following disclaimer in the -- -- documentation and/or other materials provided with the distribution. -- -- -- -- * Neither the name of the Vadim Godunko, IE nor the names of its -- -- contributors may be used to endorse or promote products derived from -- -- this software without specific prior written permission. -- -- -- -- THIS SOFTWARE IS PROVIDED BY THE COPYRIGHT HOLDERS AND CONTRIBUTORS -- -- "AS IS" AND ANY EXPRESS OR IMPLIED WARRANTIES, INCLUDING, BUT NOT -- -- LIMITED TO, THE IMPLIED WARRANTIES OF MERCHANTABILITY AND FITNESS FOR -- -- A PARTICULAR PURPOSE ARE DISCLAIMED. IN NO EVENT SHALL THE COPYRIGHT -- -- HOLDER OR CONTRIBUTORS BE LIABLE FOR ANY DIRECT, INDIRECT, INCIDENTAL, -- -- SPECIAL, EXEMPLARY, OR CONSEQUENTIAL DAMAGES (INCLUDING, BUT NOT LIMITED -- -- TO, PROCUREMENT OF SUBSTITUTE GOODS OR SERVICES; LOSS OF USE, DATA, OR -- -- PROFITS; OR BUSINESS INTERRUPTION) HOWEVER CAUSED AND ON ANY THEORY OF -- -- LIABILITY, WHETHER IN CONTRACT, STRICT LIABILITY, OR TORT (INCLUDING -- -- NEGLIGENCE OR OTHERWISE) ARISING IN ANY WAY OUT OF THE USE OF THIS -- -- SOFTWARE, EVEN IF ADVISED OF THE POSSIBILITY OF SUCH DAMAGE. -- -- -- ------------------------------------------------------------------------------ -- $Revision$ $Date$ ------------------------------------------------------------------------------ with Matreshka.DOM_Documents; with Matreshka.ODF_String_Constants; with ODF.DOM.Iterators; with ODF.DOM.Visitors; package body Matreshka.ODF_Draw.Handle_Range_Y_Maximum_Attributes is ------------ -- Create -- ------------ overriding function Create (Parameters : not null access Matreshka.DOM_Attributes.Attribute_L2_Parameters) return Draw_Handle_Range_Y_Maximum_Attribute_Node is begin return Self : Draw_Handle_Range_Y_Maximum_Attribute_Node do Matreshka.ODF_Draw.Constructors.Initialize (Self'Unchecked_Access, Parameters.Document, Matreshka.ODF_String_Constants.Draw_Prefix); end return; end Create; -------------------- -- Get_Local_Name -- -------------------- overriding function Get_Local_Name (Self : not null access constant Draw_Handle_Range_Y_Maximum_Attribute_Node) return League.Strings.Universal_String is pragma Unreferenced (Self); begin return Matreshka.ODF_String_Constants.Handle_Range_Y_Maximum_Attribute; end Get_Local_Name; begin Matreshka.DOM_Documents.Register_Attribute (Matreshka.ODF_String_Constants.Draw_URI, Matreshka.ODF_String_Constants.Handle_Range_Y_Maximum_Attribute, Draw_Handle_Range_Y_Maximum_Attribute_Node'Tag); end Matreshka.ODF_Draw.Handle_Range_Y_Maximum_Attributes;