repo_name
stringlengths
9
74
language
stringclasses
1 value
length_bytes
int64
11
9.34M
extension
stringclasses
2 values
content
stringlengths
11
9.34M
optikos/oasis
Ada
10,297
ads
-- Copyright (c) 2019 Maxim Reznik <[email protected]> -- -- SPDX-License-Identifier: MIT -- License-Filename: LICENSE ------------------------------------------------------------- with Program.Lexical_Elements; with Program.Elements.Defining_Names; with Program.Elements.Parameter_Specifications; with Program.Elements.Expressions; with Program.Elements.Aspect_Specifications; with Program.Elements.Formal_Function_Declarations; with Program.Element_Visitors; package Program.Nodes.Formal_Function_Declarations is pragma Preelaborate; type Formal_Function_Declaration is new Program.Nodes.Node and Program.Elements.Formal_Function_Declarations .Formal_Function_Declaration and Program.Elements.Formal_Function_Declarations .Formal_Function_Declaration_Text with private; function Create (With_Token : not null Program.Lexical_Elements .Lexical_Element_Access; Function_Token : not null Program.Lexical_Elements .Lexical_Element_Access; Name : not null Program.Elements.Defining_Names .Defining_Name_Access; Left_Bracket_Token : Program.Lexical_Elements.Lexical_Element_Access; Parameters : Program.Elements.Parameter_Specifications .Parameter_Specification_Vector_Access; Right_Bracket_Token : Program.Lexical_Elements.Lexical_Element_Access; Return_Token : not null Program.Lexical_Elements .Lexical_Element_Access; Not_Token : Program.Lexical_Elements.Lexical_Element_Access; Null_Token : Program.Lexical_Elements.Lexical_Element_Access; Result_Subtype : not null Program.Elements.Element_Access; Is_Token : Program.Lexical_Elements.Lexical_Element_Access; Abstract_Token : Program.Lexical_Elements.Lexical_Element_Access; Subprogram_Default : Program.Elements.Expressions.Expression_Access; Box_Token : Program.Lexical_Elements.Lexical_Element_Access; With_Token_2 : Program.Lexical_Elements.Lexical_Element_Access; Aspects : Program.Elements.Aspect_Specifications .Aspect_Specification_Vector_Access; Semicolon_Token : not null Program.Lexical_Elements .Lexical_Element_Access) return Formal_Function_Declaration; type Implicit_Formal_Function_Declaration is new Program.Nodes.Node and Program.Elements.Formal_Function_Declarations .Formal_Function_Declaration with private; function Create (Name : not null Program.Elements.Defining_Names .Defining_Name_Access; Parameters : Program.Elements.Parameter_Specifications .Parameter_Specification_Vector_Access; Result_Subtype : not null Program.Elements.Element_Access; Subprogram_Default : Program.Elements.Expressions.Expression_Access; Aspects : Program.Elements.Aspect_Specifications .Aspect_Specification_Vector_Access; Is_Part_Of_Implicit : Boolean := False; Is_Part_Of_Inherited : Boolean := False; Is_Part_Of_Instance : Boolean := False; Has_Not_Null : Boolean := False; Has_Abstract : Boolean := False; Has_Box : Boolean := False) return Implicit_Formal_Function_Declaration with Pre => Is_Part_Of_Implicit or Is_Part_Of_Inherited or Is_Part_Of_Instance; private type Base_Formal_Function_Declaration is abstract new Program.Nodes.Node and Program.Elements.Formal_Function_Declarations .Formal_Function_Declaration with record Name : not null Program.Elements.Defining_Names .Defining_Name_Access; Parameters : Program.Elements.Parameter_Specifications .Parameter_Specification_Vector_Access; Result_Subtype : not null Program.Elements.Element_Access; Subprogram_Default : Program.Elements.Expressions.Expression_Access; Aspects : Program.Elements.Aspect_Specifications .Aspect_Specification_Vector_Access; end record; procedure Initialize (Self : aliased in out Base_Formal_Function_Declaration'Class); overriding procedure Visit (Self : not null access Base_Formal_Function_Declaration; Visitor : in out Program.Element_Visitors.Element_Visitor'Class); overriding function Name (Self : Base_Formal_Function_Declaration) return not null Program.Elements.Defining_Names.Defining_Name_Access; overriding function Parameters (Self : Base_Formal_Function_Declaration) return Program.Elements.Parameter_Specifications .Parameter_Specification_Vector_Access; overriding function Result_Subtype (Self : Base_Formal_Function_Declaration) return not null Program.Elements.Element_Access; overriding function Subprogram_Default (Self : Base_Formal_Function_Declaration) return Program.Elements.Expressions.Expression_Access; overriding function Aspects (Self : Base_Formal_Function_Declaration) return Program.Elements.Aspect_Specifications .Aspect_Specification_Vector_Access; overriding function Is_Formal_Function_Declaration_Element (Self : Base_Formal_Function_Declaration) return Boolean; overriding function Is_Declaration_Element (Self : Base_Formal_Function_Declaration) return Boolean; type Formal_Function_Declaration is new Base_Formal_Function_Declaration and Program.Elements.Formal_Function_Declarations .Formal_Function_Declaration_Text with record With_Token : not null Program.Lexical_Elements .Lexical_Element_Access; Function_Token : not null Program.Lexical_Elements .Lexical_Element_Access; Left_Bracket_Token : Program.Lexical_Elements.Lexical_Element_Access; Right_Bracket_Token : Program.Lexical_Elements.Lexical_Element_Access; Return_Token : not null Program.Lexical_Elements .Lexical_Element_Access; Not_Token : Program.Lexical_Elements.Lexical_Element_Access; Null_Token : Program.Lexical_Elements.Lexical_Element_Access; Is_Token : Program.Lexical_Elements.Lexical_Element_Access; Abstract_Token : Program.Lexical_Elements.Lexical_Element_Access; Box_Token : Program.Lexical_Elements.Lexical_Element_Access; With_Token_2 : Program.Lexical_Elements.Lexical_Element_Access; Semicolon_Token : not null Program.Lexical_Elements .Lexical_Element_Access; end record; overriding function To_Formal_Function_Declaration_Text (Self : aliased in out Formal_Function_Declaration) return Program.Elements.Formal_Function_Declarations .Formal_Function_Declaration_Text_Access; overriding function With_Token (Self : Formal_Function_Declaration) return not null Program.Lexical_Elements.Lexical_Element_Access; overriding function Function_Token (Self : Formal_Function_Declaration) return not null Program.Lexical_Elements.Lexical_Element_Access; overriding function Left_Bracket_Token (Self : Formal_Function_Declaration) return Program.Lexical_Elements.Lexical_Element_Access; overriding function Right_Bracket_Token (Self : Formal_Function_Declaration) return Program.Lexical_Elements.Lexical_Element_Access; overriding function Return_Token (Self : Formal_Function_Declaration) return not null Program.Lexical_Elements.Lexical_Element_Access; overriding function Not_Token (Self : Formal_Function_Declaration) return Program.Lexical_Elements.Lexical_Element_Access; overriding function Null_Token (Self : Formal_Function_Declaration) return Program.Lexical_Elements.Lexical_Element_Access; overriding function Is_Token (Self : Formal_Function_Declaration) return Program.Lexical_Elements.Lexical_Element_Access; overriding function Abstract_Token (Self : Formal_Function_Declaration) return Program.Lexical_Elements.Lexical_Element_Access; overriding function Box_Token (Self : Formal_Function_Declaration) return Program.Lexical_Elements.Lexical_Element_Access; overriding function With_Token_2 (Self : Formal_Function_Declaration) return Program.Lexical_Elements.Lexical_Element_Access; overriding function Semicolon_Token (Self : Formal_Function_Declaration) return not null Program.Lexical_Elements.Lexical_Element_Access; overriding function Has_Not_Null (Self : Formal_Function_Declaration) return Boolean; overriding function Has_Abstract (Self : Formal_Function_Declaration) return Boolean; overriding function Has_Box (Self : Formal_Function_Declaration) return Boolean; type Implicit_Formal_Function_Declaration is new Base_Formal_Function_Declaration with record Is_Part_Of_Implicit : Boolean; Is_Part_Of_Inherited : Boolean; Is_Part_Of_Instance : Boolean; Has_Not_Null : Boolean; Has_Abstract : Boolean; Has_Box : Boolean; end record; overriding function To_Formal_Function_Declaration_Text (Self : aliased in out Implicit_Formal_Function_Declaration) return Program.Elements.Formal_Function_Declarations .Formal_Function_Declaration_Text_Access; overriding function Is_Part_Of_Implicit (Self : Implicit_Formal_Function_Declaration) return Boolean; overriding function Is_Part_Of_Inherited (Self : Implicit_Formal_Function_Declaration) return Boolean; overriding function Is_Part_Of_Instance (Self : Implicit_Formal_Function_Declaration) return Boolean; overriding function Has_Not_Null (Self : Implicit_Formal_Function_Declaration) return Boolean; overriding function Has_Abstract (Self : Implicit_Formal_Function_Declaration) return Boolean; overriding function Has_Box (Self : Implicit_Formal_Function_Declaration) return Boolean; end Program.Nodes.Formal_Function_Declarations;
mirror/ncurses
Ada
3,858
adb
------------------------------------------------------------------------------ -- -- -- GNAT ncurses Binding -- -- -- -- Terminal_Interface.Curses.Text_IO.Complex_IO -- -- -- -- B O D Y -- -- -- ------------------------------------------------------------------------------ -- Copyright 2020 Thomas E. Dickey -- -- Copyright 1999-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 ------------------------------------------------------------------------------ with Terminal_Interface.Curses.Text_IO.Float_IO; package body Terminal_Interface.Curses.Text_IO.Complex_IO is package FIO is new Terminal_Interface.Curses.Text_IO.Float_IO (Complex_Types.Real'Base); procedure Put (Win : Window; Item : Complex; Fore : Field := Default_Fore; Aft : Field := Default_Aft; Exp : Field := Default_Exp) is begin Put (Win, '('); FIO.Put (Win, Item.Re, Fore, Aft, Exp); Put (Win, ','); FIO.Put (Win, Item.Im, Fore, Aft, Exp); Put (Win, ')'); end Put; procedure Put (Item : Complex; Fore : Field := Default_Fore; Aft : Field := Default_Aft; Exp : Field := Default_Exp) is begin Put (Get_Window, Item, Fore, Aft, Exp); end Put; end Terminal_Interface.Curses.Text_IO.Complex_IO;
reznikmm/matreshka
Ada
5,076
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. ------------------------------------------------------------------------------ with AMF.CMOF.Elements; limited with AMF.CMOF.Elements.Collections; with League.Strings; package AMF.CMOF.Tags is pragma Preelaborate; type CMOF_Tag is limited interface and AMF.CMOF.Elements.CMOF_Element; type CMOF_Tag_Access is access all CMOF_Tag'Class; for CMOF_Tag_Access'Storage_Size use 0; not overriding function Get_Name (Self : not null access constant CMOF_Tag) return League.Strings.Universal_String is abstract; -- Getter of Tag::name. -- not overriding procedure Set_Name (Self : not null access CMOF_Tag; To : League.Strings.Universal_String) is abstract; -- Setter of Tag::name. -- not overriding function Get_Value (Self : not null access constant CMOF_Tag) return League.Strings.Universal_String is abstract; -- Getter of Tag::value. -- not overriding procedure Set_Value (Self : not null access CMOF_Tag; To : League.Strings.Universal_String) is abstract; -- Setter of Tag::value. -- not overriding function Get_Element (Self : not null access constant CMOF_Tag) return AMF.CMOF.Elements.Collections.Set_Of_CMOF_Element is abstract; -- Getter of Tag::element. -- not overriding function Get_Tag_Owner (Self : not null access constant CMOF_Tag) return AMF.CMOF.Elements.CMOF_Element_Access is abstract; -- Getter of Tag::tagOwner. -- not overriding procedure Set_Tag_Owner (Self : not null access CMOF_Tag; To : AMF.CMOF.Elements.CMOF_Element_Access) is abstract; -- Setter of Tag::tagOwner. -- end AMF.CMOF.Tags;
reznikmm/matreshka
Ada
4,887
adb
------------------------------------------------------------------------------ -- -- -- Matreshka Project -- -- -- -- XML Processor -- -- -- -- Tools Component -- -- -- ------------------------------------------------------------------------------ -- -- -- Copyright © 2013-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 League.Strings.Hash; with XSD_To_Ada.Utils; package body XSD_To_Ada.Mappings is use type League.Strings.Universal_String; ----------------------------- -- Ada_Type_Qualified_Name -- ----------------------------- function Ada_Type_Qualified_Name (Self : Mapping'Class; XSD_Type_Name : League.Strings.Universal_String; Min_Occurs : Boolean := False; Max_Occurs : Boolean := False) return League.Strings.Universal_String is K : Key := (XSD_Type_Name, Single); begin if Max_Occurs then K.Multiplicity := Vector; elsif Min_Occurs then K.Multiplicity := Optional; end if; if Self.Mapping.Contains (K) then return Self.Mapping.Element (K).Ada_Name; else if Max_Occurs then return "IATS_Types." & XSD_To_Ada.Utils.Add_Separator (XSD_Type_Name) & "_Vector"; elsif Min_Occurs then return "IATS_Types.Optional_" & XSD_To_Ada.Utils.Add_Separator (XSD_Type_Name); else return "IATS_Types." & XSD_To_Ada.Utils.Add_Separator (XSD_Type_Name); end if; end if; end Ada_Type_Qualified_Name; ---------- -- Hash -- ---------- function Hash (Value : Key) return Ada.Containers.Hash_Type is use type Ada.Containers.Hash_Type; begin return League.Strings.Hash (Value.Name) + Multiplicity_Kind'Pos (Value.Multiplicity); end Hash; end XSD_To_Ada.Mappings;
MinimSecure/unum-sdk
Ada
807
ads
-- Copyright 2015-2016 Free Software Foundation, Inc. -- -- This program is free software; you can redistribute it and/or modify -- it under the terms of the GNU General Public License as published by -- the Free Software Foundation; either version 3 of the License, or -- (at your option) any later version. -- -- This program is distributed in the hope that it will be useful, -- but WITHOUT ANY WARRANTY; without even the implied warranty of -- MERCHANTABILITY or FITNESS FOR A PARTICULAR PURPOSE. See the -- GNU General Public License for more details. -- -- You should have received a copy of the GNU General Public License -- along with this program. If not, see <http://www.gnu.org/licenses/>. package Aux_Pck is procedure Ambiguous_Func; procedure Ambiguous_Proc; end Aux_Pck;
charlie5/aShell
Ada
588
adb
with Shell.Commands.Unsafe, Ada.Text_IO; procedure Test_Pipeline_Output is use Ada.Text_IO; begin Put_Line ("Begin 'Pipeline_Output' test."); New_Line (2); declare use Shell, Shell.Commands, Shell.Commands.Unsafe, Shell.Commands.Unsafe.Forge; Commands : Command_Array := To_Commands ("ps -A | grep bash | wc"); Output : constant String := +Output_Of (Run (Commands)); begin Put_Line ("'" & Output & "'"); end; New_Line (2); Put_Line ("End 'Pipeline_Output' test."); end Test_Pipeline_Output;
stcarrez/ada-util
Ada
5,672
adb
----------------------------------------------------------------------- -- util-streams -- Stream utilities -- Copyright (C) 2010, 2011, 2016, 2018, 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 Interfaces; package body Util.Streams is use Ada.Streams; subtype Offset is Ada.Streams.Stream_Element_Offset; -- ------------------------------ -- Copy the input stream to the output stream until the end of the input stream -- is reached. -- ------------------------------ procedure Copy (From : in out Input_Stream'Class; Into : in out Output_Stream'Class) is Buffer : Stream_Element_Array (0 .. 4_096); Last : Stream_Element_Offset; begin loop From.Read (Buffer, Last); if Last > Buffer'First then Into.Write (Buffer (Buffer'First .. Last)); end if; exit when Last < Buffer'Last; end loop; end Copy; -- ------------------------------ -- Copy the stream array to the string. -- The string must be large enough to hold the stream array -- or a Constraint_Error exception is raised. -- ------------------------------ procedure Copy (From : in Ada.Streams.Stream_Element_Array; Into : in out String) is Target : Stream_Element_Array (Stream_Element_Offset (Into'First) .. Stream_Element_Offset (Into'Last)); for Target'Address use Into'Address; begin Target (Target'First .. Target'First + From'Length - 1) := From; end Copy; -- ------------------------------ -- Copy the string to the stream array. -- The stream array must be large enough to hold the string -- or a Constraint_Error exception is raised. -- ------------------------------ procedure Copy (From : in String; Into : in out Ada.Streams.Stream_Element_Array) is Target : String (Natural (Into'First) .. Natural (Into'Last)); for Target'Address use Into'Address; begin Target (Target'First .. Target'First + From'Length - 1) := From; end Copy; -- ------------------------------ -- Write a raw character on the stream. -- ------------------------------ procedure Write (Stream : in out Output_Stream'Class; Item : in Character) is Buf : constant Ada.Streams.Stream_Element_Array (1 .. 1) := (1 => Ada.Streams.Stream_Element (Character'Pos (Item))); begin Stream.Write (Buf); end Write; -- ------------------------------ -- 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'Class; Item : in Wide_Wide_Character) is use Interfaces; Val : Unsigned_32; Buf : Ada.Streams.Stream_Element_Array (1 .. 4); begin -- UTF-8 conversion -- 7 U+0000 U+007F 1 0xxxxxxx -- 11 U+0080 U+07FF 2 110xxxxx 10xxxxxx -- 16 U+0800 U+FFFF 3 1110xxxx 10xxxxxx 10xxxxxx -- 21 U+10000 U+1FFFFF 4 11110xxx 10xxxxxx 10xxxxxx 10xxxxxx Val := Wide_Wide_Character'Pos (Item); if Val <= 16#7f# then Buf (1) := Ada.Streams.Stream_Element (Val); Stream.Write (Buf (1 .. 1)); elsif Val <= 16#07FF# then Buf (1) := Stream_Element (16#C0# or Shift_Right (Val, 6)); Buf (2) := Stream_Element (16#80# or (Val and 16#03F#)); Stream.Write (Buf (1 .. 2)); elsif Val <= 16#0FFFF# then Buf (1) := Stream_Element (16#E0# or Shift_Right (Val, 12)); Val := Val and 16#0FFF#; Buf (2) := Stream_Element (16#80# or Shift_Right (Val, 6)); Buf (3) := Stream_Element (16#80# or (Val and 16#03F#)); Stream.Write (Buf (1 .. 3)); else Val := Val and 16#1FFFFF#; Buf (1) := Stream_Element (16#F0# or Shift_Right (Val, 18)); Val := Val and 16#3FFFF#; Buf (2) := Stream_Element (16#80# or Shift_Right (Val, 12)); Val := Val and 16#0FFF#; Buf (3) := Stream_Element (16#80# or Shift_Right (Val, 6)); Buf (4) := Stream_Element (16#80# or (Val and 16#03F#)); Stream.Write (Buf (1 .. 4)); end if; end Write_Wide; procedure Write_Wide (Stream : in out Output_Stream'Class; Item : in Wide_Wide_String) is begin for C of Item loop Stream.Write_Wide (C); end loop; end Write_Wide; -- ------------------------------ -- Write a raw string on the stream. -- ------------------------------ procedure Write (Stream : in out Output_Stream'Class; Item : in String) is Buf : Ada.Streams.Stream_Element_Array (Offset (Item'First) .. Offset (Item'Last)); for Buf'Address use Item'Address; begin Stream.Write (Buf); end Write; end Util.Streams;
zhmu/ananas
Ada
104,169
adb
------------------------------------------------------------------------------ -- -- -- GNAT COMPILER COMPONENTS -- -- -- -- A L I -- -- -- -- B o d y -- -- -- -- 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. -- -- -- ------------------------------------------------------------------------------ with Butil; use Butil; with Debug; use Debug; with Fname; use Fname; with Opt; use Opt; with Osint; use Osint; with Output; use Output; with Snames; use Snames; with GNAT; use GNAT; with GNAT.Dynamic_HTables; use GNAT.Dynamic_HTables; package body ALI is use ASCII; -- Make control characters visible ----------- -- Types -- ----------- -- The following type represents an invocation construct type Invocation_Construct_Record is record Body_Placement : Declaration_Placement_Kind := No_Declaration_Placement; -- The location of the invocation construct's body with respect to the -- unit where it is declared. Kind : Invocation_Construct_Kind := Regular_Construct; -- The nature of the invocation construct Signature : Invocation_Signature_Id := No_Invocation_Signature; -- The invocation signature that uniquely identifies the invocation -- construct in the ALI space. Spec_Placement : Declaration_Placement_Kind := No_Declaration_Placement; -- The location of the invocation construct's spec with respect to the -- unit where it is declared. end record; -- The following type represents an invocation relation. It associates an -- invoker that activates/calls/instantiates with a target. type Invocation_Relation_Record is record Extra : Name_Id := No_Name; -- The name of an additional entity used in error diagnostics Invoker : Invocation_Signature_Id := No_Invocation_Signature; -- The invocation signature that uniquely identifies the invoker within -- the ALI space. Kind : Invocation_Kind := No_Invocation; -- The nature of the invocation Target : Invocation_Signature_Id := No_Invocation_Signature; -- The invocation signature that uniquely identifies the target within -- the ALI space. end record; -- The following type represents an invocation signature. Its purpose is -- to uniquely identify an invocation construct within the ALI space. The -- signature comprises several pieces, some of which are used in error -- diagnostics by the binder. Identification issues are resolved as -- follows: -- -- * The Column, Line, and Locations attributes together differentiate -- between homonyms. In most cases, the Column and Line are sufficient -- except when generic instantiations are involved. Together, the three -- attributes offer a sequence of column-line pairs that eventually -- reflect the location within the generic template. -- -- * The Name attribute differentiates between invocation constructs at -- the scope level. Since it is illegal for two entities with the same -- name to coexist in the same scope, the Name attribute is sufficient -- to distinguish them. Overloaded entities are already handled by the -- Column, Line, and Locations attributes. -- -- * The Scope attribute differentiates between invocation constructs at -- various levels of nesting. type Invocation_Signature_Record is record Column : Nat := 0; -- The column number where the invocation construct is declared Line : Nat := 0; -- The line number where the invocation construct is declared Locations : Name_Id := No_Name; -- Sequence of column and line numbers within nested instantiations Name : Name_Id := No_Name; -- The name of the invocation construct Scope : Name_Id := No_Name; -- The qualified name of the scope where the invocation construct is -- declared. end record; --------------------- -- Data structures -- --------------------- package Invocation_Constructs is new Table.Table (Table_Index_Type => Invocation_Construct_Id, Table_Component_Type => Invocation_Construct_Record, Table_Low_Bound => First_Invocation_Construct, Table_Initial => 2500, Table_Increment => 200, Table_Name => "Invocation_Constructs"); package Invocation_Relations is new Table.Table (Table_Index_Type => Invocation_Relation_Id, Table_Component_Type => Invocation_Relation_Record, Table_Low_Bound => First_Invocation_Relation, Table_Initial => 2500, Table_Increment => 200, Table_Name => "Invocation_Relation"); package Invocation_Signatures is new Table.Table (Table_Index_Type => Invocation_Signature_Id, Table_Component_Type => Invocation_Signature_Record, Table_Low_Bound => First_Invocation_Signature, Table_Initial => 2500, Table_Increment => 200, Table_Name => "Invocation_Signatures"); procedure Destroy (IS_Id : in out Invocation_Signature_Id); -- Destroy an invocation signature with id IS_Id function Hash (IS_Rec : Invocation_Signature_Record) return Bucket_Range_Type; -- Obtain the hash of key IS_Rec package Sig_Map is new Dynamic_Hash_Tables (Key_Type => Invocation_Signature_Record, Value_Type => Invocation_Signature_Id, No_Value => No_Invocation_Signature, Expansion_Threshold => 1.5, Expansion_Factor => 2, Compression_Threshold => 0.3, Compression_Factor => 2, "=" => "=", Destroy_Value => Destroy, Hash => Hash); -- The following map relates invocation signature records to invocation -- signature ids. Sig_To_Sig_Map : constant Sig_Map.Dynamic_Hash_Table := Sig_Map.Create (500); -- The folowing table maps declaration placement kinds to character codes -- for invocation construct encoding in ALI files. Declaration_Placement_Codes : constant array (Declaration_Placement_Kind) of Character := (In_Body => 'b', In_Spec => 's', No_Declaration_Placement => 'Z'); Compile_Time_Invocation_Graph_Encoding : Invocation_Graph_Encoding_Kind := No_Encoding; -- The invocation-graph encoding format as specified at compile time. Do -- not manipulate this value directly. -- The following table maps invocation kinds to character codes for -- invocation relation encoding in ALI files. Invocation_Codes : constant array (Invocation_Kind) of Character := (Accept_Alternative => 'a', Access_Taken => 'b', Call => 'c', Controlled_Adjustment => 'd', Controlled_Finalization => 'e', Controlled_Initialization => 'f', Default_Initial_Condition_Verification => 'g', Initial_Condition_Verification => 'h', Instantiation => 'i', Internal_Controlled_Adjustment => 'j', Internal_Controlled_Finalization => 'k', Internal_Controlled_Initialization => 'l', Invariant_Verification => 'm', Postcondition_Verification => 'n', Protected_Entry_Call => 'o', Protected_Subprogram_Call => 'p', Task_Activation => 'q', Task_Entry_Call => 'r', Type_Initialization => 's', No_Invocation => 'Z'); -- The following table maps invocation construct kinds to character codes -- for invocation construct encoding in ALI files. Invocation_Construct_Codes : constant array (Invocation_Construct_Kind) of Character := (Elaborate_Body_Procedure => 'b', Elaborate_Spec_Procedure => 's', Regular_Construct => 'Z'); -- The following table maps invocation-graph encoding kinds to character -- codes for invocation-graph encoding in ALI files. Invocation_Graph_Encoding_Codes : constant array (Invocation_Graph_Encoding_Kind) of Character := (Full_Path_Encoding => 'f', Endpoints_Encoding => 'e', No_Encoding => 'Z'); -- The following table maps invocation-graph line kinds to character codes -- used in ALI files. Invocation_Graph_Line_Codes : constant array (Invocation_Graph_Line_Kind) of Character := (Invocation_Construct_Line => 'c', Invocation_Graph_Attributes_Line => 'a', Invocation_Relation_Line => 'r'); -- The following variable records which characters currently are used as -- line type markers in the ALI file. This is used in Scan_ALI to detect -- (or skip) invalid lines. Known_ALI_Lines : constant array (Character range 'A' .. 'Z') of Boolean := ('A' | -- argument 'C' | -- SCO information 'D' | -- dependency 'E' | -- external 'G' | -- invocation graph 'I' | -- interrupt 'L' | -- linker option 'M' | -- main program 'N' | -- notes 'P' | -- program 'R' | -- restriction 'S' | -- specific dispatching 'T' | -- task stack information 'U' | -- unit 'V' | -- version 'W' | -- with 'X' | -- xref 'Y' | -- limited_with 'Z' -- implicit with from instantiation => True, -- Still available: 'B' | 'F' | 'H' | 'J' | 'K' | 'O' | 'Q' => False); ------------------------------ -- Add_Invocation_Construct -- ------------------------------ procedure Add_Invocation_Construct (Body_Placement : Declaration_Placement_Kind; Kind : Invocation_Construct_Kind; Signature : Invocation_Signature_Id; Spec_Placement : Declaration_Placement_Kind; Update_Units : Boolean := True) is begin pragma Assert (Present (Signature)); -- Create a invocation construct from the scanned attributes Invocation_Constructs.Append ((Body_Placement => Body_Placement, Kind => Kind, Signature => Signature, Spec_Placement => Spec_Placement)); -- Update the invocation construct counter of the current unit only when -- requested by the caller. if Update_Units then declare Curr_Unit : Unit_Record renames Units.Table (Units.Last); begin Curr_Unit.Last_Invocation_Construct := Invocation_Constructs.Last; end; end if; end Add_Invocation_Construct; ----------------------------- -- Add_Invocation_Relation -- ----------------------------- procedure Add_Invocation_Relation (Extra : Name_Id; Invoker : Invocation_Signature_Id; Kind : Invocation_Kind; Target : Invocation_Signature_Id; Update_Units : Boolean := True) is begin pragma Assert (Present (Invoker)); pragma Assert (Kind /= No_Invocation); pragma Assert (Present (Target)); -- Create an invocation relation from the scanned attributes Invocation_Relations.Append ((Extra => Extra, Invoker => Invoker, Kind => Kind, Target => Target)); -- Update the invocation relation counter of the current unit only when -- requested by the caller. if Update_Units then declare Curr_Unit : Unit_Record renames Units.Table (Units.Last); begin Curr_Unit.Last_Invocation_Relation := Invocation_Relations.Last; end; end if; end Add_Invocation_Relation; -------------------- -- Body_Placement -- -------------------- function Body_Placement (IC_Id : Invocation_Construct_Id) return Declaration_Placement_Kind is begin pragma Assert (Present (IC_Id)); return Invocation_Constructs.Table (IC_Id).Body_Placement; end Body_Placement; ---------------------------------------- -- Code_To_Declaration_Placement_Kind -- ---------------------------------------- function Code_To_Declaration_Placement_Kind (Code : Character) return Declaration_Placement_Kind is begin -- Determine which placement kind corresponds to the character code by -- traversing the contents of the mapping table. for Kind in Declaration_Placement_Kind loop if Declaration_Placement_Codes (Kind) = Code then return Kind; end if; end loop; raise Program_Error; end Code_To_Declaration_Placement_Kind; --------------------------------------- -- Code_To_Invocation_Construct_Kind -- --------------------------------------- function Code_To_Invocation_Construct_Kind (Code : Character) return Invocation_Construct_Kind is begin -- Determine which invocation construct kind matches the character code -- by traversing the contents of the mapping table. for Kind in Invocation_Construct_Kind loop if Invocation_Construct_Codes (Kind) = Code then return Kind; end if; end loop; raise Program_Error; end Code_To_Invocation_Construct_Kind; -------------------------------------------- -- Code_To_Invocation_Graph_Encoding_Kind -- -------------------------------------------- function Code_To_Invocation_Graph_Encoding_Kind (Code : Character) return Invocation_Graph_Encoding_Kind is begin -- Determine which invocation-graph encoding kind matches the character -- code by traversing the contents of the mapping table. for Kind in Invocation_Graph_Encoding_Kind loop if Invocation_Graph_Encoding_Codes (Kind) = Code then return Kind; end if; end loop; raise Program_Error; end Code_To_Invocation_Graph_Encoding_Kind; ----------------------------- -- Code_To_Invocation_Kind -- ----------------------------- function Code_To_Invocation_Kind (Code : Character) return Invocation_Kind is begin -- Determine which invocation kind corresponds to the character code by -- traversing the contents of the mapping table. for Kind in Invocation_Kind loop if Invocation_Codes (Kind) = Code then return Kind; end if; end loop; raise Program_Error; end Code_To_Invocation_Kind; ---------------------------------------- -- Code_To_Invocation_Graph_Line_Kind -- ---------------------------------------- function Code_To_Invocation_Graph_Line_Kind (Code : Character) return Invocation_Graph_Line_Kind is begin -- Determine which invocation-graph line kind matches the character -- code by traversing the contents of the mapping table. for Kind in Invocation_Graph_Line_Kind loop if Invocation_Graph_Line_Codes (Kind) = Code then return Kind; end if; end loop; raise Program_Error; end Code_To_Invocation_Graph_Line_Kind; ------------ -- Column -- ------------ function Column (IS_Id : Invocation_Signature_Id) return Nat is begin pragma Assert (Present (IS_Id)); return Invocation_Signatures.Table (IS_Id).Column; end Column; ---------------------------------------- -- Declaration_Placement_Kind_To_Code -- ---------------------------------------- function Declaration_Placement_Kind_To_Code (Kind : Declaration_Placement_Kind) return Character is begin return Declaration_Placement_Codes (Kind); end Declaration_Placement_Kind_To_Code; ------------- -- Destroy -- ------------- procedure Destroy (IS_Id : in out Invocation_Signature_Id) is pragma Unreferenced (IS_Id); begin null; end Destroy; ----------- -- Extra -- ----------- function Extra (IR_Id : Invocation_Relation_Id) return Name_Id is begin pragma Assert (Present (IR_Id)); return Invocation_Relations.Table (IR_Id).Extra; end Extra; ----------------------------------- -- For_Each_Invocation_Construct -- ----------------------------------- procedure For_Each_Invocation_Construct (Processor : Invocation_Construct_Processor_Ptr) is begin pragma Assert (Processor /= null); for IC_Id in Invocation_Constructs.First .. Invocation_Constructs.Last loop Processor.all (IC_Id); end loop; end For_Each_Invocation_Construct; ----------------------------------- -- For_Each_Invocation_Construct -- ----------------------------------- procedure For_Each_Invocation_Construct (U_Id : Unit_Id; Processor : Invocation_Construct_Processor_Ptr) is pragma Assert (Present (U_Id)); pragma Assert (Processor /= null); U_Rec : Unit_Record renames Units.Table (U_Id); begin for IC_Id in U_Rec.First_Invocation_Construct .. U_Rec.Last_Invocation_Construct loop Processor.all (IC_Id); end loop; end For_Each_Invocation_Construct; ---------------------------------- -- For_Each_Invocation_Relation -- ---------------------------------- procedure For_Each_Invocation_Relation (Processor : Invocation_Relation_Processor_Ptr) is begin pragma Assert (Processor /= null); for IR_Id in Invocation_Relations.First .. Invocation_Relations.Last loop Processor.all (IR_Id); end loop; end For_Each_Invocation_Relation; ---------------------------------- -- For_Each_Invocation_Relation -- ---------------------------------- procedure For_Each_Invocation_Relation (U_Id : Unit_Id; Processor : Invocation_Relation_Processor_Ptr) is pragma Assert (Present (U_Id)); pragma Assert (Processor /= null); U_Rec : Unit_Record renames Units.Table (U_Id); begin for IR_Id in U_Rec.First_Invocation_Relation .. U_Rec.Last_Invocation_Relation loop Processor.all (IR_Id); end loop; end For_Each_Invocation_Relation; ---------- -- Hash -- ---------- function Hash (IS_Rec : Invocation_Signature_Record) return Bucket_Range_Type is Buffer : Bounded_String (2052); IS_Nam : Name_Id; begin -- The hash is obtained in the following manner: -- -- * A String signature based on the scope, name, line number, column -- number, and locations, in the following format: -- -- scope__name__line_column__locations -- -- * The String is converted into a Name_Id -- -- * The absolute value of the Name_Id is used as the hash Append (Buffer, IS_Rec.Scope); Append (Buffer, "__"); Append (Buffer, IS_Rec.Name); Append (Buffer, "__"); Append (Buffer, IS_Rec.Line); Append (Buffer, '_'); Append (Buffer, IS_Rec.Column); if IS_Rec.Locations /= No_Name then Append (Buffer, "__"); Append (Buffer, IS_Rec.Locations); end if; IS_Nam := Name_Find (Buffer); return Bucket_Range_Type (abs IS_Nam); end Hash; -------------------- -- Initialize_ALI -- -------------------- procedure Initialize_ALI is begin -- When (re)initializing ALI data structures the ALI user expects to -- get a fresh set of data structures. Thus we first need to erase the -- marks put in the name table by the previous set of ALI routine calls. -- These two loops are empty and harmless the first time in. for J in ALIs.First .. ALIs.Last loop Set_Name_Table_Int (ALIs.Table (J).Afile, 0); end loop; for J in Units.First .. Units.Last loop Set_Name_Table_Int (Units.Table (J).Uname, 0); end loop; -- Free argument table strings for J in Args.First .. Args.Last loop Free (Args.Table (J)); end loop; -- Initialize all tables ALIs.Init; Invocation_Constructs.Init; Invocation_Relations.Init; Invocation_Signatures.Init; Linker_Options.Init; No_Deps.Init; Notes.Init; Sdep.Init; Units.Init; Version_Ref.Reset; Withs.Init; Xref_Entity.Init; Xref.Init; Xref_Section.Init; -- Add dummy zeroth item in Linker_Options and Notes for sort calls Linker_Options.Increment_Last; Notes.Increment_Last; -- Initialize global variables recording cumulative options in all -- ALI files that are read for a given processing run in gnatbind. Dynamic_Elaboration_Checks_Specified := False; Locking_Policy_Specified := ' '; No_Normalize_Scalars_Specified := False; No_Object_Specified := False; No_Component_Reordering_Specified := False; GNATprove_Mode_Specified := False; Normalize_Scalars_Specified := False; Partition_Elaboration_Policy_Specified := ' '; Queuing_Policy_Specified := ' '; SSO_Default_Specified := False; Task_Dispatching_Policy_Specified := ' '; Unreserve_All_Interrupts_Specified := False; Frontend_Exceptions_Specified := False; Zero_Cost_Exceptions_Specified := False; end Initialize_ALI; --------------------------------------- -- Invocation_Construct_Kind_To_Code -- --------------------------------------- function Invocation_Construct_Kind_To_Code (Kind : Invocation_Construct_Kind) return Character is begin return Invocation_Construct_Codes (Kind); end Invocation_Construct_Kind_To_Code; ------------------------------- -- Invocation_Graph_Encoding -- ------------------------------- function Invocation_Graph_Encoding return Invocation_Graph_Encoding_Kind is begin return Compile_Time_Invocation_Graph_Encoding; end Invocation_Graph_Encoding; -------------------------------------------- -- Invocation_Graph_Encoding_Kind_To_Code -- -------------------------------------------- function Invocation_Graph_Encoding_Kind_To_Code (Kind : Invocation_Graph_Encoding_Kind) return Character is begin return Invocation_Graph_Encoding_Codes (Kind); end Invocation_Graph_Encoding_Kind_To_Code; ---------------------------------------- -- Invocation_Graph_Line_Kind_To_Code -- ---------------------------------------- function Invocation_Graph_Line_Kind_To_Code (Kind : Invocation_Graph_Line_Kind) return Character is begin return Invocation_Graph_Line_Codes (Kind); end Invocation_Graph_Line_Kind_To_Code; ----------------------------- -- Invocation_Kind_To_Code -- ----------------------------- function Invocation_Kind_To_Code (Kind : Invocation_Kind) return Character is begin return Invocation_Codes (Kind); end Invocation_Kind_To_Code; ----------------------------- -- Invocation_Signature_Of -- ----------------------------- function Invocation_Signature_Of (Column : Nat; Line : Nat; Locations : Name_Id; Name : Name_Id; Scope : Name_Id) return Invocation_Signature_Id is IS_Rec : constant Invocation_Signature_Record := (Column => Column, Line => Line, Locations => Locations, Name => Name, Scope => Scope); IS_Id : Invocation_Signature_Id; begin IS_Id := Sig_Map.Get (Sig_To_Sig_Map, IS_Rec); -- The invocation signature lacks an id. This indicates that it -- is encountered for the first time during the construction of -- the graph. if not Present (IS_Id) then Invocation_Signatures.Append (IS_Rec); IS_Id := Invocation_Signatures.Last; -- Map the invocation signature record to its corresponding id Sig_Map.Put (Sig_To_Sig_Map, IS_Rec, IS_Id); end if; return IS_Id; end Invocation_Signature_Of; ------------- -- Invoker -- ------------- function Invoker (IR_Id : Invocation_Relation_Id) return Invocation_Signature_Id is begin pragma Assert (Present (IR_Id)); return Invocation_Relations.Table (IR_Id).Invoker; end Invoker; ---------- -- Kind -- ---------- function Kind (IC_Id : Invocation_Construct_Id) return Invocation_Construct_Kind is begin pragma Assert (Present (IC_Id)); return Invocation_Constructs.Table (IC_Id).Kind; end Kind; ---------- -- Kind -- ---------- function Kind (IR_Id : Invocation_Relation_Id) return Invocation_Kind is begin pragma Assert (Present (IR_Id)); return Invocation_Relations.Table (IR_Id).Kind; end Kind; ---------- -- Line -- ---------- function Line (IS_Id : Invocation_Signature_Id) return Nat is begin pragma Assert (Present (IS_Id)); return Invocation_Signatures.Table (IS_Id).Line; end Line; --------------- -- Locations -- --------------- function Locations (IS_Id : Invocation_Signature_Id) return Name_Id is begin pragma Assert (Present (IS_Id)); return Invocation_Signatures.Table (IS_Id).Locations; end Locations; ---------- -- Name -- ---------- function Name (IS_Id : Invocation_Signature_Id) return Name_Id is begin pragma Assert (Present (IS_Id)); return Invocation_Signatures.Table (IS_Id).Name; end Name; ------------- -- Present -- ------------- function Present (IC_Id : Invocation_Construct_Id) return Boolean is begin return IC_Id /= No_Invocation_Construct; end Present; ------------- -- Present -- ------------- function Present (IR_Id : Invocation_Relation_Id) return Boolean is begin return IR_Id /= No_Invocation_Relation; end Present; ------------- -- Present -- ------------- function Present (IS_Id : Invocation_Signature_Id) return Boolean is begin return IS_Id /= No_Invocation_Signature; end Present; ------------- -- Present -- ------------- function Present (Dep : Sdep_Id) return Boolean is begin return Dep /= No_Sdep_Id; end Present; ------------- -- Present -- ------------- function Present (U_Id : Unit_Id) return Boolean is begin return U_Id /= No_Unit_Id; end Present; ------------- -- Present -- ------------- function Present (W_Id : With_Id) return Boolean is begin return W_Id /= No_With_Id; end Present; -------------- -- Scan_ALI -- -------------- function Scan_ALI (F : File_Name_Type; T : Text_Buffer_Ptr; Err : Boolean; Ignore_Lines : String := "X"; Ignore_Errors : Boolean := False; Directly_Scanned : Boolean := False) return ALI_Id is P : Text_Ptr := T'First; Line : Logical_Line_Number := 1; Id : ALI_Id; C : Character; NS_Found : Boolean; First_Arg : Arg_Id; Ignore : array (Character range 'A' .. 'Z') of Boolean := (others => False); -- Ignore (X) is set to True if lines starting with X are to -- be ignored by Scan_ALI and skipped, and False if the lines -- are to be read and processed. Bad_ALI_Format : exception; -- Exception raised by Fatal_Error if Err is True function At_Eol return Boolean; -- Test if at end of line function At_End_Of_Field return Boolean; -- Test if at end of line, or if at blank or horizontal tab procedure Check_At_End_Of_Field; -- Check if we are at end of field, fatal error if not procedure Checkc (C : Character); -- Check next character is C. If so bump past it, if not fatal error procedure Check_Unknown_Line; -- If Ignore_Errors mode, then checks C to make sure that it is not -- an unknown ALI line type characters, and if so, skips lines -- until the first character of the line is one of these characters, -- at which point it does a Getc to put that character in C. The -- call has no effect if C is already an appropriate character. -- If not in Ignore_Errors mode, a fatal error is signalled if the -- line is unknown. Note that if C is an EOL on entry, the line is -- skipped (it is assumed that blank lines are never significant). -- If C is EOF on entry, the call has no effect (it is assumed that -- the caller will properly handle this case). procedure Fatal_Error; -- Generate fatal error message for badly formatted ALI file if -- Err is false, or raise Bad_ALI_Format if Err is True. procedure Fatal_Error_Ignore; pragma Inline (Fatal_Error_Ignore); -- In Ignore_Errors mode, has no effect, otherwise same as Fatal_Error function Getc return Character; -- Get next character, bumping P past the character obtained function Get_File_Name (Lower : Boolean := False; May_Be_Quoted : Boolean := False) return File_Name_Type; -- Skip blanks, then scan out a file name (name is left in Name_Buffer -- with length in Name_Len, as well as returning a File_Name_Type value. -- If May_Be_Quoted is True and the first non blank character is '"', -- then remove starting and ending quotes and undoubled internal quotes. -- If lower is false, the case is unchanged, if Lower is True then the -- result is forced to all lower case for systems where file names are -- not case sensitive. This ensures that gnatbind works correctly -- regardless of the case of the file name on all systems. The scan -- is terminated by a end of line, space or horizontal tab. Any other -- special characters are included in the returned name. function Get_Name (Ignore_Special : Boolean := False; May_Be_Quoted : Boolean := False) return Name_Id; -- Skip blanks, then scan out a name (name is left in Name_Buffer with -- length in Name_Len, as well as being returned in Name_Id form). -- If Lower is set to True then the Name_Buffer will be converted to -- all lower case, for systems where file names are not case sensitive. -- This ensures that gnatbind works correctly regardless of the case -- of the file name on all systems. -- -- The scan is terminated by the normal end of field condition -- (EOL, space, horizontal tab). Furthermore, the termination condition -- depends on the setting of Ignore_Special: -- -- If Ignore_Special is False (normal case), the scan is terminated by -- a typeref bracket or an equal sign except for the special case of -- an operator name starting with a double quote that is terminated -- by another double quote. -- -- If May_Be_Quoted is True and the first non blank character is '"' -- the name is 'unquoted'. In this case Ignore_Special is ignored and -- assumed to be True. -- -- This function handles wide characters properly. function Get_Nat return Nat; -- Skip blanks, then scan out an unsigned integer value in Nat range -- raises ALI_Reading_Error if the encoutered type is not natural. function Get_Stamp return Time_Stamp_Type; -- Skip blanks, then scan out a time stamp function Get_Unit_Name return Unit_Name_Type; -- Skip blanks, then scan out a file name (name is left in Name_Buffer -- with length in Name_Len, as well as returning a Unit_Name_Type value. -- The case is unchanged and terminated by a normal end of field. function Nextc return Character; -- Return current character without modifying pointer P procedure Scan_Invocation_Graph_Line; -- Parse a single line that encodes a piece of the invocation graph procedure Skip_Eol; -- Skip past spaces, then skip past end of line (fatal error if not -- at end of line). Also skips past any following blank lines. procedure Skip_Line; -- Skip rest of current line and any following blank lines procedure Skip_Space; -- Skip past white space (blanks or horizontal tab) procedure Skipc; -- Skip past next character, does not affect value in C. This call -- is like calling Getc and ignoring the returned result. --------------------- -- At_End_Of_Field -- --------------------- function At_End_Of_Field return Boolean is begin return Nextc <= ' '; end At_End_Of_Field; ------------ -- At_Eol -- ------------ function At_Eol return Boolean is begin return Nextc = EOF or else Nextc = CR or else Nextc = LF; end At_Eol; --------------------------- -- Check_At_End_Of_Field -- --------------------------- procedure Check_At_End_Of_Field is begin if not At_End_Of_Field then if Ignore_Errors then while Nextc > ' ' loop P := P + 1; end loop; else Fatal_Error; end if; end if; end Check_At_End_Of_Field; ------------------------ -- Check_Unknown_Line -- ------------------------ procedure Check_Unknown_Line is begin while C not in 'A' .. 'Z' or else not Known_ALI_Lines (C) loop if C = CR or else C = LF then Skip_Line; C := Nextc; elsif C = EOF then return; elsif Ignore_Errors then Skip_Line; C := Getc; else Fatal_Error; end if; end loop; end Check_Unknown_Line; ------------ -- Checkc -- ------------ procedure Checkc (C : Character) is begin if Nextc = C then P := P + 1; elsif Ignore_Errors then P := P + 1; else Fatal_Error; end if; end Checkc; ----------------- -- Fatal_Error -- ----------------- procedure Fatal_Error is Ptr1 : Text_Ptr; Ptr2 : Text_Ptr; Col : Int; procedure Wchar (C : Character); -- Write a single character, replacing horizontal tab by spaces procedure Wchar (C : Character) is begin if C = HT then loop Wchar (' '); exit when Col mod 8 = 0; end loop; else Write_Char (C); Col := Col + 1; end if; end Wchar; -- Start of processing for Fatal_Error begin if Err then raise Bad_ALI_Format; end if; Set_Standard_Error; Write_Str ("fatal error: file "); Write_Name (F); Write_Str (" is incorrectly formatted"); Write_Eol; Write_Str ("make sure you are using consistent versions " & -- Split the following line so that it can easily be transformed for -- other back-ends where the compiler might have a different name. "of gcc/gnatbind"); Write_Eol; -- Find start of line Ptr1 := P; while Ptr1 > T'First and then T (Ptr1 - 1) /= CR and then T (Ptr1 - 1) /= LF loop Ptr1 := Ptr1 - 1; end loop; Write_Int (Int (Line)); Write_Str (". "); if Line < 100 then Write_Char (' '); end if; if Line < 10 then Write_Char (' '); end if; Col := 0; Ptr2 := Ptr1; while Ptr2 < T'Last and then T (Ptr2) /= CR and then T (Ptr2) /= LF loop Wchar (T (Ptr2)); Ptr2 := Ptr2 + 1; end loop; Write_Eol; Write_Str (" "); Col := 0; while Ptr1 < P loop if T (Ptr1) = HT then Wchar (HT); else Wchar (' '); end if; Ptr1 := Ptr1 + 1; end loop; Wchar ('|'); Write_Eol; Exit_Program (E_Fatal); end Fatal_Error; ------------------------ -- Fatal_Error_Ignore -- ------------------------ procedure Fatal_Error_Ignore is begin if not Ignore_Errors then Fatal_Error; end if; end Fatal_Error_Ignore; ------------------- -- Get_File_Name -- ------------------- function Get_File_Name (Lower : Boolean := False; May_Be_Quoted : Boolean := False) return File_Name_Type is F : Name_Id; begin F := Get_Name (Ignore_Special => True, May_Be_Quoted => May_Be_Quoted); -- Convert file name to all lower case if file names are not case -- sensitive. This ensures that we handle names in the canonical -- lower case format, regardless of the actual case. if Lower and not File_Names_Case_Sensitive then Canonical_Case_File_Name (Name_Buffer (1 .. Name_Len)); return Name_Find; else return File_Name_Type (F); end if; end Get_File_Name; -------------- -- Get_Name -- -------------- function Get_Name (Ignore_Special : Boolean := False; May_Be_Quoted : Boolean := False) return Name_Id is Char : Character; begin Name_Len := 0; Skip_Space; if At_Eol then if Ignore_Errors then return Error_Name; else Fatal_Error; end if; end if; Char := Getc; -- Deal with quoted characters if May_Be_Quoted and then Char = '"' then loop if At_Eol then if Ignore_Errors then return Error_Name; else Fatal_Error; end if; end if; Char := Getc; if Char = '"' then if At_Eol then exit; else Char := Getc; if Char /= '"' then P := P - 1; exit; end if; end if; end if; Add_Char_To_Name_Buffer (Char); end loop; -- Other than case of quoted character else P := P - 1; loop Add_Char_To_Name_Buffer (Getc); exit when At_End_Of_Field; if not Ignore_Special then if Name_Buffer (1) = '"' then exit when Name_Len > 1 and then Name_Buffer (Name_Len) = '"'; else -- Terminate on parens or angle brackets or equal sign exit when Nextc = '(' or else Nextc = ')' or else Nextc = '{' or else Nextc = '}' or else Nextc = '<' or else Nextc = '>' or else Nextc = '='; -- Terminate on comma exit when Nextc = ','; -- Terminate if left bracket not part of wide char -- sequence. exit when Nextc = '[' and then T (P + 1) /= '"'; -- Terminate if right bracket not part of wide char -- sequence. exit when Nextc = ']' and then T (P - 1) /= '"'; end if; end if; end loop; end if; return Name_Find; end Get_Name; ------------------- -- Get_Unit_Name -- ------------------- function Get_Unit_Name return Unit_Name_Type is begin return Unit_Name_Type (Get_Name); end Get_Unit_Name; ------------- -- Get_Nat -- ------------- function Get_Nat return Nat is V : Nat; begin Skip_Space; -- Check if we are on a number. In the case of bad ALI files, this -- may not be true. if not (Nextc in '0' .. '9') then Fatal_Error; end if; V := 0; loop V := V * 10 + (Character'Pos (Getc) - Character'Pos ('0')); exit when At_End_Of_Field; exit when Nextc < '0' or else Nextc > '9'; end loop; return V; end Get_Nat; --------------- -- Get_Stamp -- --------------- function Get_Stamp return Time_Stamp_Type is T : Time_Stamp_Type; Start : Integer; begin Skip_Space; if At_Eol then if Ignore_Errors then return Dummy_Time_Stamp; else Fatal_Error; end if; end if; -- Following reads old style time stamp missing first two digits if Nextc in '7' .. '9' then T (1) := '1'; T (2) := '9'; Start := 3; -- Normal case of full year in time stamp else Start := 1; end if; for J in Start .. T'Last loop T (J) := Getc; end loop; return T; end Get_Stamp; ---------- -- Getc -- ---------- function Getc return Character is begin if P = T'Last then return EOF; else P := P + 1; return T (P - 1); end if; end Getc; ----------- -- Nextc -- ----------- function Nextc return Character is begin return T (P); end Nextc; -------------------------------- -- Scan_Invocation_Graph_Line -- -------------------------------- procedure Scan_Invocation_Graph_Line is procedure Scan_Invocation_Construct_Line; pragma Inline (Scan_Invocation_Construct_Line); -- Parse an invocation construct line and construct the corresponding -- construct. The following data structures are updated: -- -- * Invocation_Constructs -- * Units procedure Scan_Invocation_Graph_Attributes_Line; pragma Inline (Scan_Invocation_Graph_Attributes_Line); -- Parse an invocation-graph attributes line. The following data -- structures are updated: -- -- * Units procedure Scan_Invocation_Relation_Line; pragma Inline (Scan_Invocation_Relation_Line); -- Parse an invocation relation line and construct the corresponding -- relation. The following data structures are updated: -- -- * Invocation_Relations -- * Units function Scan_Invocation_Signature return Invocation_Signature_Id; pragma Inline (Scan_Invocation_Signature); -- Parse a single invocation signature while populating the following -- data structures: -- -- * Invocation_Signatures -- * Sig_To_Sig_Map ------------------------------------ -- Scan_Invocation_Construct_Line -- ------------------------------------ procedure Scan_Invocation_Construct_Line is Body_Placement : Declaration_Placement_Kind; Kind : Invocation_Construct_Kind; Signature : Invocation_Signature_Id; Spec_Placement : Declaration_Placement_Kind; begin -- construct-kind Kind := Code_To_Invocation_Construct_Kind (Getc); Checkc (' '); Skip_Space; -- construct-spec-placement Spec_Placement := Code_To_Declaration_Placement_Kind (Getc); Checkc (' '); Skip_Space; -- construct-body-placement Body_Placement := Code_To_Declaration_Placement_Kind (Getc); Checkc (' '); Skip_Space; -- construct-signature Signature := Scan_Invocation_Signature; Skip_Eol; Add_Invocation_Construct (Body_Placement => Body_Placement, Kind => Kind, Signature => Signature, Spec_Placement => Spec_Placement); end Scan_Invocation_Construct_Line; ------------------------------------------- -- Scan_Invocation_Graph_Attributes_Line -- ------------------------------------------- procedure Scan_Invocation_Graph_Attributes_Line is begin -- encoding-kind Set_Invocation_Graph_Encoding (Code_To_Invocation_Graph_Encoding_Kind (Getc)); Skip_Eol; end Scan_Invocation_Graph_Attributes_Line; ----------------------------------- -- Scan_Invocation_Relation_Line -- ----------------------------------- procedure Scan_Invocation_Relation_Line is Extra : Name_Id; Invoker : Invocation_Signature_Id; Kind : Invocation_Kind; Target : Invocation_Signature_Id; begin -- relation-kind Kind := Code_To_Invocation_Kind (Getc); Checkc (' '); Skip_Space; -- (extra-name | "none") Extra := Get_Name; if Extra = Name_None then Extra := No_Name; end if; Checkc (' '); Skip_Space; -- invoker-signature Invoker := Scan_Invocation_Signature; Checkc (' '); Skip_Space; -- target-signature Target := Scan_Invocation_Signature; Skip_Eol; Add_Invocation_Relation (Extra => Extra, Invoker => Invoker, Kind => Kind, Target => Target); end Scan_Invocation_Relation_Line; ------------------------------- -- Scan_Invocation_Signature -- ------------------------------- function Scan_Invocation_Signature return Invocation_Signature_Id is Column : Nat; Line : Nat; Locations : Name_Id; Name : Name_Id; Scope : Name_Id; begin -- [ Checkc ('['); -- name Name := Get_Name; Checkc (' '); Skip_Space; -- scope Scope := Get_Name; Checkc (' '); Skip_Space; -- line Line := Get_Nat; Checkc (' '); Skip_Space; -- column Column := Get_Nat; Checkc (' '); Skip_Space; -- (locations | "none") Locations := Get_Name; if Locations = Name_None then Locations := No_Name; end if; -- ] Checkc (']'); -- Create an invocation signature from the scanned attributes return Invocation_Signature_Of (Column => Column, Line => Line, Locations => Locations, Name => Name, Scope => Scope); end Scan_Invocation_Signature; -- Local variables Line : Invocation_Graph_Line_Kind; -- Start of processing for Scan_Invocation_Graph_Line begin if Ignore ('G') then return; end if; Checkc (' '); Skip_Space; -- line-kind Line := Code_To_Invocation_Graph_Line_Kind (Getc); Checkc (' '); Skip_Space; -- line-attributes case Line is when Invocation_Construct_Line => Scan_Invocation_Construct_Line; when Invocation_Graph_Attributes_Line => Scan_Invocation_Graph_Attributes_Line; when Invocation_Relation_Line => Scan_Invocation_Relation_Line; end case; end Scan_Invocation_Graph_Line; -------------- -- Skip_Eol -- -------------- procedure Skip_Eol is begin Skip_Space; if not At_Eol then if Ignore_Errors then while not At_Eol loop P := P + 1; end loop; else Fatal_Error; end if; end if; -- Loop to skip past blank lines (first time through skips this EOL) while Nextc < ' ' and then Nextc /= EOF loop if Nextc = LF then Line := Line + 1; end if; P := P + 1; end loop; end Skip_Eol; --------------- -- Skip_Line -- --------------- procedure Skip_Line is begin while not At_Eol loop P := P + 1; end loop; Skip_Eol; end Skip_Line; ---------------- -- Skip_Space -- ---------------- procedure Skip_Space is begin while Nextc = ' ' or else Nextc = HT loop P := P + 1; end loop; end Skip_Space; ----------- -- Skipc -- ----------- procedure Skipc is begin if P /= T'Last then P := P + 1; end if; end Skipc; -- Start of processing for Scan_ALI begin First_Sdep_Entry := Sdep.Last + 1; for J in Ignore_Lines'Range loop pragma Assert (Ignore_Lines (J) /= 'U'); Ignore (Ignore_Lines (J)) := True; end loop; -- Setup ALI Table entry with appropriate defaults ALIs.Increment_Last; Id := ALIs.Last; Set_Name_Table_Int (F, Int (Id)); ALIs.Table (Id) := ( Afile => F, Compile_Errors => False, First_Interrupt_State => Interrupt_States.Last + 1, First_Sdep => No_Sdep_Id, First_Specific_Dispatching => Specific_Dispatching.Last + 1, First_Unit => No_Unit_Id, GNATprove_Mode => False, Invocation_Graph_Encoding => No_Encoding, Last_Interrupt_State => Interrupt_States.Last, Last_Sdep => No_Sdep_Id, Last_Specific_Dispatching => Specific_Dispatching.Last, Last_Unit => No_Unit_Id, Locking_Policy => ' ', Main_Priority => -1, Main_CPU => -1, Main_Program => None, No_Component_Reordering => False, No_Object => False, Normalize_Scalars => False, Ofile_Full_Name => Full_Object_File_Name, Partition_Elaboration_Policy => ' ', Queuing_Policy => ' ', Restrictions => No_Restrictions, SAL_Interface => False, Sfile => No_File, SSO_Default => ' ', Task_Dispatching_Policy => ' ', Time_Slice_Value => -1, WC_Encoding => 'b', Unit_Exception_Table => False, Ver => (others => ' '), Ver_Len => 0, Frontend_Exceptions => False, Zero_Cost_Exceptions => False); -- Now we acquire the input lines from the ALI file. Note that the -- convention in the following code is that as we enter each section, -- C is set to contain the first character of the following line. C := Getc; Check_Unknown_Line; -- Acquire library version if C /= 'V' then -- The V line missing really indicates trouble, most likely it -- means we don't have an ALI file at all, so here we give a -- fatal error even if we are in Ignore_Errors mode. Fatal_Error; elsif Ignore ('V') then Skip_Line; else Checkc (' '); Skip_Space; Checkc ('"'); for J in 1 .. Ver_Len_Max loop C := Getc; exit when C = '"'; ALIs.Table (Id).Ver (J) := C; ALIs.Table (Id).Ver_Len := J; end loop; Skip_Eol; end if; C := Getc; Check_Unknown_Line; -- Acquire main program line if present if C = 'M' then if Ignore ('M') then Skip_Line; else Checkc (' '); Skip_Space; C := Getc; if C = 'F' then ALIs.Table (Id).Main_Program := Func; elsif C = 'P' then ALIs.Table (Id).Main_Program := Proc; else P := P - 1; Fatal_Error; end if; Skip_Space; if not At_Eol then if Nextc < 'A' then ALIs.Table (Id).Main_Priority := Get_Nat; end if; Skip_Space; if Nextc = 'T' then P := P + 1; Checkc ('='); ALIs.Table (Id).Time_Slice_Value := Get_Nat; end if; Skip_Space; if Nextc = 'C' then P := P + 1; Checkc ('='); ALIs.Table (Id).Main_CPU := Get_Nat; end if; Skip_Space; Checkc ('W'); Checkc ('='); ALIs.Table (Id).WC_Encoding := Getc; end if; Skip_Eol; end if; C := Getc; end if; -- Acquire argument lines First_Arg := Args.Last + 1; A_Loop : loop Check_Unknown_Line; exit A_Loop when C /= 'A'; if Ignore ('A') then Skip_Line; else Checkc (' '); -- Scan out argument Name_Len := 0; while not At_Eol loop Add_Char_To_Name_Buffer (Getc); end loop; -- If -fstack-check, record that it occurred. Note that an -- additional string parameter can be specified, in the form of -- -fstack-check={no|generic|specific}. "no" means no checking, -- "generic" means force the use of old-style checking, and -- "specific" means use the best checking method. if Name_Len >= 13 and then Name_Buffer (1 .. 13) = "-fstack-check" and then Name_Buffer (1 .. Name_Len) /= "-fstack-check=no" then Stack_Check_Switch_Set := True; end if; -- Store the argument Args.Increment_Last; Args.Table (Args.Last) := new String'(Name_Buffer (1 .. Name_Len)); Skip_Eol; end if; C := Getc; end loop A_Loop; -- Acquire P line Check_Unknown_Line; while C /= 'P' loop if Ignore_Errors then if C = EOF then Fatal_Error; else Skip_Line; C := Nextc; end if; else Fatal_Error; end if; end loop; if Ignore ('P') then Skip_Line; -- Process P line else NS_Found := False; while not At_Eol loop Checkc (' '); Skip_Space; C := Getc; -- Processing for CE if C = 'C' then Checkc ('E'); ALIs.Table (Id).Compile_Errors := True; -- Processing for DB elsif C = 'D' then Checkc ('B'); Detect_Blocking := True; -- Processing for Ex elsif C = 'E' then Partition_Elaboration_Policy_Specified := Getc; ALIs.Table (Id).Partition_Elaboration_Policy := Partition_Elaboration_Policy_Specified; -- Processing for FX elsif C = 'F' then C := Getc; if C = 'X' then ALIs.Table (Id).Frontend_Exceptions := True; Frontend_Exceptions_Specified := True; else Fatal_Error_Ignore; end if; -- Processing for GP elsif C = 'G' then Checkc ('P'); GNATprove_Mode_Specified := True; ALIs.Table (Id).GNATprove_Mode := True; -- Processing for Lx elsif C = 'L' then Locking_Policy_Specified := Getc; ALIs.Table (Id).Locking_Policy := Locking_Policy_Specified; -- Processing for flags starting with N elsif C = 'N' then C := Getc; -- Processing for NC if C = 'C' then ALIs.Table (Id).No_Component_Reordering := True; No_Component_Reordering_Specified := True; -- Processing for NO elsif C = 'O' then ALIs.Table (Id).No_Object := True; No_Object_Specified := True; -- Processing for NR elsif C = 'R' then No_Run_Time_Mode := True; Configurable_Run_Time_Mode := True; -- Processing for NS elsif C = 'S' then ALIs.Table (Id).Normalize_Scalars := True; Normalize_Scalars_Specified := True; NS_Found := True; -- Invalid switch starting with N else Fatal_Error_Ignore; end if; -- Processing for OH/OL elsif C = 'O' then C := Getc; if C = 'L' or else C = 'H' then ALIs.Table (Id).SSO_Default := C; SSO_Default_Specified := True; else Fatal_Error_Ignore; end if; -- Processing for Qx elsif C = 'Q' then Queuing_Policy_Specified := Getc; ALIs.Table (Id).Queuing_Policy := Queuing_Policy_Specified; -- Processing for flags starting with S elsif C = 'S' then C := Getc; -- Processing for SL if C = 'L' then ALIs.Table (Id).SAL_Interface := True; -- Processing for SS elsif C = 'S' then Opt.Sec_Stack_Used := True; -- Invalid switch starting with S else Fatal_Error_Ignore; end if; -- Processing for Tx elsif C = 'T' then Task_Dispatching_Policy_Specified := Getc; ALIs.Table (Id).Task_Dispatching_Policy := Task_Dispatching_Policy_Specified; -- Processing for switch starting with U elsif C = 'U' then C := Getc; -- Processing for UA if C = 'A' then Unreserve_All_Interrupts_Specified := True; -- Processing for UX elsif C = 'X' then ALIs.Table (Id).Unit_Exception_Table := True; -- Invalid switches starting with U else Fatal_Error_Ignore; end if; -- Processing for ZX elsif C = 'Z' then C := Getc; if C = 'X' then ALIs.Table (Id).Zero_Cost_Exceptions := True; Zero_Cost_Exceptions_Specified := True; else Fatal_Error_Ignore; end if; -- Invalid parameter else C := Getc; Fatal_Error_Ignore; end if; end loop; if not NS_Found then No_Normalize_Scalars_Specified := True; end if; Skip_Eol; end if; C := Getc; Check_Unknown_Line; -- Loop to skip to first restrictions line while C /= 'R' loop if Ignore_Errors then if C = EOF then Fatal_Error; else Skip_Line; C := Nextc; end if; else Fatal_Error; end if; end loop; -- Ignore all 'R' lines if that is required if Ignore ('R') then while C = 'R' loop Skip_Line; C := Getc; end loop; -- Here we process the restrictions lines (other than unit name cases) else Scan_Restrictions : declare Save_R : constant Restrictions_Info := Cumulative_Restrictions; -- Save cumulative restrictions in case we have a fatal error Bad_R_Line : exception; -- Signal bad restrictions line (raised on unexpected character) Typ : Character; R : Restriction_Id; N : Natural; begin -- Named restriction case if Nextc = 'N' then Skip_Line; C := Getc; -- Loop through RR and RV lines while C = 'R' and then Nextc /= ' ' loop Typ := Getc; Checkc (' '); -- Acquire restriction name Name_Len := 0; while not At_Eol and then Nextc /= '=' loop Name_Len := Name_Len + 1; Name_Buffer (Name_Len) := Getc; end loop; -- Now search list of restrictions to find match declare RN : String renames Name_Buffer (1 .. Name_Len); begin R := Restriction_Id'First; while R /= Not_A_Restriction_Id loop if Restriction_Id'Image (R) = RN then goto R_Found; end if; R := Restriction_Id'Succ (R); end loop; -- We don't recognize the restriction. This might be -- thought of as an error, and it really is, but we -- want to allow building with inconsistent versions -- of the binder and ali files (see comments at the -- start of package System.Rident), so we just ignore -- this situation. goto Done_With_Restriction_Line; end; <<R_Found>> case R is -- Boolean restriction case when All_Boolean_Restrictions => case Typ is when 'V' => ALIs.Table (Id).Restrictions.Violated (R) := True; Cumulative_Restrictions.Violated (R) := True; when 'R' => ALIs.Table (Id).Restrictions.Set (R) := True; Cumulative_Restrictions.Set (R) := True; when others => raise Bad_R_Line; end case; -- Parameter restriction case when All_Parameter_Restrictions => if At_Eol or else Nextc /= '=' then raise Bad_R_Line; else Skipc; end if; N := Natural (Get_Nat); case Typ is -- Restriction set when 'R' => ALIs.Table (Id).Restrictions.Set (R) := True; ALIs.Table (Id).Restrictions.Value (R) := N; if Cumulative_Restrictions.Set (R) then Cumulative_Restrictions.Value (R) := Integer'Min (Cumulative_Restrictions.Value (R), N); else Cumulative_Restrictions.Set (R) := True; Cumulative_Restrictions.Value (R) := N; end if; -- Restriction violated when 'V' => ALIs.Table (Id).Restrictions.Violated (R) := True; Cumulative_Restrictions.Violated (R) := True; ALIs.Table (Id).Restrictions.Count (R) := N; -- Checked Max_Parameter case if R in Checked_Max_Parameter_Restrictions then Cumulative_Restrictions.Count (R) := Integer'Max (Cumulative_Restrictions.Count (R), N); -- Other checked parameter cases else declare pragma Unsuppress (Overflow_Check); begin Cumulative_Restrictions.Count (R) := Cumulative_Restrictions.Count (R) + N; exception when Constraint_Error => -- A constraint error comes from the -- addition. We reset to the maximum -- and indicate that the real value -- is now unknown. Cumulative_Restrictions.Value (R) := Integer'Last; Cumulative_Restrictions.Unknown (R) := True; end; end if; -- Deal with + case if Nextc = '+' then Skipc; ALIs.Table (Id).Restrictions.Unknown (R) := True; Cumulative_Restrictions.Unknown (R) := True; end if; -- Other than 'R' or 'V' when others => raise Bad_R_Line; end case; if not At_Eol then raise Bad_R_Line; end if; -- Bizarre error case NOT_A_RESTRICTION when Not_A_Restriction_Id => raise Bad_R_Line; end case; if not At_Eol then raise Bad_R_Line; end if; <<Done_With_Restriction_Line>> Skip_Line; C := Getc; end loop; -- Positional restriction case else Checkc (' '); Skip_Space; -- Acquire information for boolean restrictions for R in All_Boolean_Restrictions loop C := Getc; case C is when 'v' => ALIs.Table (Id).Restrictions.Violated (R) := True; Cumulative_Restrictions.Violated (R) := True; when 'r' => ALIs.Table (Id).Restrictions.Set (R) := True; Cumulative_Restrictions.Set (R) := True; when 'n' => null; when others => raise Bad_R_Line; end case; end loop; -- Acquire information for parameter restrictions for RP in All_Parameter_Restrictions loop case Getc is when 'n' => null; when 'r' => ALIs.Table (Id).Restrictions.Set (RP) := True; declare N : constant Integer := Integer (Get_Nat); begin ALIs.Table (Id).Restrictions.Value (RP) := N; if Cumulative_Restrictions.Set (RP) then Cumulative_Restrictions.Value (RP) := Integer'Min (Cumulative_Restrictions.Value (RP), N); else Cumulative_Restrictions.Set (RP) := True; Cumulative_Restrictions.Value (RP) := N; end if; end; when others => raise Bad_R_Line; end case; -- Acquire restrictions violations information case Getc is when 'n' => null; when 'v' => ALIs.Table (Id).Restrictions.Violated (RP) := True; Cumulative_Restrictions.Violated (RP) := True; declare N : constant Integer := Integer (Get_Nat); begin ALIs.Table (Id).Restrictions.Count (RP) := N; if RP in Checked_Max_Parameter_Restrictions then Cumulative_Restrictions.Count (RP) := Integer'Max (Cumulative_Restrictions.Count (RP), N); else declare pragma Unsuppress (Overflow_Check); begin Cumulative_Restrictions.Count (RP) := Cumulative_Restrictions.Count (RP) + N; exception when Constraint_Error => -- A constraint error comes from the add. We -- reset to the maximum and indicate that the -- real value is now unknown. Cumulative_Restrictions.Value (RP) := Integer'Last; Cumulative_Restrictions.Unknown (RP) := True; end; end if; if Nextc = '+' then Skipc; ALIs.Table (Id).Restrictions.Unknown (RP) := True; Cumulative_Restrictions.Unknown (RP) := True; end if; end; when others => raise Bad_R_Line; end case; end loop; if not At_Eol then raise Bad_R_Line; else Skip_Line; C := Getc; end if; end if; -- Here if error during scanning of restrictions line exception when Bad_R_Line => -- In Ignore_Errors mode, undo any changes to restrictions -- from this unit, and continue on, skipping remaining R -- lines for this unit. if Ignore_Errors then Cumulative_Restrictions := Save_R; ALIs.Table (Id).Restrictions := No_Restrictions; loop Skip_Eol; C := Getc; exit when C /= 'R'; end loop; -- In normal mode, this is a fatal error else Fatal_Error; end if; end Scan_Restrictions; end if; -- Acquire additional restrictions (No_Dependence) lines if present while C = 'R' loop if Ignore ('R') then Skip_Line; else Skip_Space; No_Deps.Append ((Id, Get_Name)); Skip_Eol; end if; C := Getc; end loop; -- Acquire 'I' lines if present Check_Unknown_Line; while C = 'I' loop if Ignore ('I') then Skip_Line; else declare Int_Num : Nat; I_State : Character; Line_No : Nat; begin Int_Num := Get_Nat; Skip_Space; I_State := Getc; Line_No := Get_Nat; Interrupt_States.Append ( (Interrupt_Id => Int_Num, Interrupt_State => I_State, IS_Pragma_Line => Line_No)); ALIs.Table (Id).Last_Interrupt_State := Interrupt_States.Last; Skip_Eol; end; end if; C := Getc; end loop; -- Acquire 'S' lines if present Check_Unknown_Line; while C = 'S' loop if Ignore ('S') then Skip_Line; else declare Policy : Character; First_Prio : Nat; Last_Prio : Nat; Line_No : Nat; begin Checkc (' '); Skip_Space; Policy := Getc; Skip_Space; First_Prio := Get_Nat; Last_Prio := Get_Nat; Line_No := Get_Nat; Specific_Dispatching.Append ( (Dispatching_Policy => Policy, First_Priority => First_Prio, Last_Priority => Last_Prio, PSD_Pragma_Line => Line_No)); ALIs.Table (Id).Last_Specific_Dispatching := Specific_Dispatching.Last; Skip_Eol; end; end if; C := Getc; end loop; -- Loop to acquire unit entries U_Loop : loop Check_Unknown_Line; exit U_Loop when C /= 'U'; -- Note: as per spec, we never ignore U lines Checkc (' '); Skip_Space; Units.Increment_Last; if ALIs.Table (Id).First_Unit = No_Unit_Id then ALIs.Table (Id).First_Unit := Units.Last; end if; declare UL : Unit_Record renames Units.Table (Units.Last); begin UL.Uname := Get_Unit_Name; UL.Predefined := Is_Predefined_Unit; UL.Internal := Is_Internal_Unit; UL.My_ALI := Id; UL.Sfile := Get_File_Name (Lower => True); UL.Pure := False; UL.Preelab := False; UL.No_Elab := False; UL.Shared_Passive := False; UL.RCI := False; UL.Remote_Types := False; UL.Serious_Errors := False; UL.Has_RACW := False; UL.Init_Scalars := False; UL.Is_Generic := False; UL.Icasing := Mixed_Case; UL.Kcasing := All_Lower_Case; UL.Dynamic_Elab := False; UL.Elaborate_Body := False; UL.Set_Elab_Entity := False; UL.Version := "00000000"; UL.First_With := Withs.Last + 1; UL.First_Arg := First_Arg; UL.First_Invocation_Construct := Invocation_Constructs.Last + 1; UL.Last_Invocation_Construct := No_Invocation_Construct; UL.First_Invocation_Relation := Invocation_Relations.Last + 1; UL.Last_Invocation_Relation := No_Invocation_Relation; UL.Elab_Position := 0; UL.SAL_Interface := ALIs.Table (Id).SAL_Interface; UL.Directly_Scanned := Directly_Scanned; UL.Body_Needed_For_SAL := False; UL.Elaborate_Body_Desirable := False; UL.Optimize_Alignment := 'O'; UL.Has_Finalizer := False; UL.Primary_Stack_Count := 0; UL.Sec_Stack_Count := 0; if Debug_Flag_U then Write_Str (" ----> reading unit "); Write_Int (Int (Units.Last)); Write_Str (" "); Write_Unit_Name (UL.Uname); Write_Str (" from file "); Write_Name (UL.Sfile); Write_Eol; end if; end; -- Check for duplicated unit in different files declare Info : constant Int := Get_Name_Table_Int (Units.Table (Units.Last).Uname); begin if Info /= 0 and then Units.Table (Units.Last).Sfile /= Units.Table (Unit_Id (Info)).Sfile then -- If Err is set then ignore duplicate unit name. This is the -- case of a call from gnatmake, where the situation can arise -- from substitution of source files. In such situations, the -- processing in gnatmake will always result in any required -- recompilations in any case, and if we consider this to be -- an error we get strange cases (for example when a generic -- instantiation is replaced by a normal package) where we -- read the old ali file, decide to recompile, and then decide -- that the old and new ali files are incompatible. if Err then null; -- If Err is not set, then this is a fatal error. This is -- the case of being called from the binder, where we must -- definitely diagnose this as an error. else Set_Standard_Error; Write_Str ("error: duplicate unit name: "); Write_Eol; Write_Str ("error: unit """); Write_Unit_Name (Units.Table (Units.Last).Uname); Write_Str (""" found in file """); Write_Name_Decoded (Units.Table (Units.Last).Sfile); Write_Char ('"'); Write_Eol; Write_Str ("error: unit """); Write_Unit_Name (Units.Table (Unit_Id (Info)).Uname); Write_Str (""" found in file """); Write_Name_Decoded (Units.Table (Unit_Id (Info)).Sfile); Write_Char ('"'); Write_Eol; Exit_Program (E_Fatal); end if; end if; end; Set_Name_Table_Int (Units.Table (Units.Last).Uname, Int (Units.Last)); -- Scan out possible version and other parameters loop Skip_Space; exit when At_Eol; C := Getc; -- Version field if C in '0' .. '9' or else C in 'a' .. 'f' then Units.Table (Units.Last).Version (1) := C; for J in 2 .. 8 loop C := Getc; Units.Table (Units.Last).Version (J) := C; end loop; -- BD/BN parameters elsif C = 'B' then C := Getc; if C = 'D' then Check_At_End_Of_Field; Units.Table (Units.Last).Elaborate_Body_Desirable := True; elsif C = 'N' then Check_At_End_Of_Field; Units.Table (Units.Last).Body_Needed_For_SAL := True; else Fatal_Error_Ignore; end if; -- DE parameter (Dynamic elaboration checks) elsif C = 'D' then C := Getc; if C = 'E' then Check_At_End_Of_Field; Units.Table (Units.Last).Dynamic_Elab := True; Dynamic_Elaboration_Checks_Specified := True; else Fatal_Error_Ignore; end if; -- EB/EE parameters elsif C = 'E' then C := Getc; if C = 'B' then Units.Table (Units.Last).Elaborate_Body := True; elsif C = 'E' then Units.Table (Units.Last).Set_Elab_Entity := True; else Fatal_Error_Ignore; end if; Check_At_End_Of_Field; -- GE parameter (generic) elsif C = 'G' then C := Getc; if C = 'E' then Check_At_End_Of_Field; Units.Table (Units.Last).Is_Generic := True; else Fatal_Error_Ignore; end if; -- IL/IS/IU parameters elsif C = 'I' then C := Getc; if C = 'L' then Units.Table (Units.Last).Icasing := All_Lower_Case; elsif C = 'S' then Units.Table (Units.Last).Init_Scalars := True; Initialize_Scalars_Used := True; elsif C = 'U' then Units.Table (Units.Last).Icasing := All_Upper_Case; else Fatal_Error_Ignore; end if; Check_At_End_Of_Field; -- KM/KU parameters elsif C = 'K' then C := Getc; if C = 'M' then Units.Table (Units.Last).Kcasing := Mixed_Case; elsif C = 'U' then Units.Table (Units.Last).Kcasing := All_Upper_Case; else Fatal_Error_Ignore; end if; Check_At_End_Of_Field; -- NE parameter elsif C = 'N' then C := Getc; if C = 'E' then Units.Table (Units.Last).No_Elab := True; Check_At_End_Of_Field; else Fatal_Error_Ignore; end if; -- PF/PR/PU/PK parameters elsif C = 'P' then C := Getc; if C = 'F' then Units.Table (Units.Last).Has_Finalizer := True; elsif C = 'R' then Units.Table (Units.Last).Preelab := True; elsif C = 'U' then Units.Table (Units.Last).Pure := True; elsif C = 'K' then Units.Table (Units.Last).Unit_Kind := 'p'; else Fatal_Error_Ignore; end if; Check_At_End_Of_Field; -- OL/OO/OS/OT parameters elsif C = 'O' then C := Getc; if C = 'L' or else C = 'O' or else C = 'S' or else C = 'T' then Units.Table (Units.Last).Optimize_Alignment := C; else Fatal_Error_Ignore; end if; Check_At_End_Of_Field; -- RC/RT parameters elsif C = 'R' then C := Getc; if C = 'C' then Units.Table (Units.Last).RCI := True; elsif C = 'T' then Units.Table (Units.Last).Remote_Types := True; elsif C = 'A' then Units.Table (Units.Last).Has_RACW := True; else Fatal_Error_Ignore; end if; Check_At_End_Of_Field; -- SE/SP/SU parameters elsif C = 'S' then C := Getc; if C = 'E' then Units.Table (Units.Last).Serious_Errors := True; elsif C = 'P' then Units.Table (Units.Last).Shared_Passive := True; elsif C = 'U' then Units.Table (Units.Last).Unit_Kind := 's'; else Fatal_Error_Ignore; end if; Check_At_End_Of_Field; else C := Getc; Fatal_Error_Ignore; end if; end loop; Skip_Eol; C := Getc; -- Scan out With lines for this unit With_Loop : loop Check_Unknown_Line; exit With_Loop when C /= 'W' and then C /= 'Y' and then C /= 'Z'; if Ignore ('W') then Skip_Line; else Checkc (' '); Skip_Space; Withs.Increment_Last; Withs.Table (Withs.Last).Uname := Get_Unit_Name; Withs.Table (Withs.Last).Elaborate := False; Withs.Table (Withs.Last).Elaborate_All := False; Withs.Table (Withs.Last).Elab_Desirable := False; Withs.Table (Withs.Last).Elab_All_Desirable := False; Withs.Table (Withs.Last).SAL_Interface := False; Withs.Table (Withs.Last).Limited_With := (C = 'Y'); Withs.Table (Withs.Last).Implicit_With := (C = 'Z'); -- Generic case with no object file available if At_Eol then Withs.Table (Withs.Last).Sfile := No_File; Withs.Table (Withs.Last).Afile := No_File; -- Normal case else Withs.Table (Withs.Last).Sfile := Get_File_Name (Lower => True); Withs.Table (Withs.Last).Afile := Get_File_Name (Lower => True); -- Scan out possible E, EA, ED, and AD parameters while not At_Eol loop Skip_Space; if Nextc = 'A' then P := P + 1; Checkc ('D'); Check_At_End_Of_Field; -- Store AD indication unless ignore required Withs.Table (Withs.Last).Elab_All_Desirable := True; elsif Nextc = 'E' then P := P + 1; if At_End_Of_Field then Withs.Table (Withs.Last).Elaborate := True; elsif Nextc = 'A' then P := P + 1; Check_At_End_Of_Field; Withs.Table (Withs.Last).Elaborate_All := True; else Checkc ('D'); Check_At_End_Of_Field; -- Store ED indication Withs.Table (Withs.Last).Elab_Desirable := True; end if; else Fatal_Error; end if; end loop; end if; Skip_Eol; end if; C := Getc; end loop With_Loop; Units.Table (Units.Last).Last_With := Withs.Last; Units.Table (Units.Last).Last_Arg := Args.Last; -- Scan out task stack information for the unit if present Check_Unknown_Line; if C = 'T' then if Ignore ('T') then Skip_Line; else Checkc (' '); Skip_Space; Units.Table (Units.Last).Primary_Stack_Count := Get_Nat; Skip_Space; Units.Table (Units.Last).Sec_Stack_Count := Get_Nat; Skip_Space; Skip_Eol; end if; C := Getc; end if; -- If there are linker options lines present, scan them Name_Len := 0; Linker_Options_Loop : loop Check_Unknown_Line; exit Linker_Options_Loop when C /= 'L'; if Ignore ('L') then Skip_Line; else Checkc (' '); Skip_Space; Checkc ('"'); loop C := Getc; if C < Character'Val (16#20#) or else C > Character'Val (16#7E#) then Fatal_Error_Ignore; elsif C = '{' then C := Character'Val (0); declare V : Natural; begin V := 0; for J in 1 .. 2 loop C := Getc; if C in '0' .. '9' then V := V * 16 + Character'Pos (C) - Character'Pos ('0'); elsif C in 'A' .. 'F' then V := V * 16 + Character'Pos (C) - Character'Pos ('A') + 10; else Fatal_Error_Ignore; end if; end loop; Checkc ('}'); Add_Char_To_Name_Buffer (Character'Val (V)); end; else if C = '"' then exit when Nextc /= '"'; C := Getc; end if; Add_Char_To_Name_Buffer (C); end if; end loop; Add_Char_To_Name_Buffer (NUL); Skip_Eol; end if; C := Getc; end loop Linker_Options_Loop; -- Store the linker options entry if one was found if Name_Len /= 0 then Linker_Options.Increment_Last; Linker_Options.Table (Linker_Options.Last).Name := Name_Enter; Linker_Options.Table (Linker_Options.Last).Unit := Units.Last; Linker_Options.Table (Linker_Options.Last).Internal_File := Is_Internal_File_Name (F); end if; -- If there are notes present, scan them Notes_Loop : loop Check_Unknown_Line; exit Notes_Loop when C /= 'N'; if Ignore ('N') then Skip_Line; else Checkc (' '); Notes.Increment_Last; Notes.Table (Notes.Last).Pragma_Type := Getc; Notes.Table (Notes.Last).Pragma_Line := Get_Nat; Checkc (':'); Notes.Table (Notes.Last).Pragma_Col := Get_Nat; if not At_Eol and then Nextc = ':' then Checkc (':'); Notes.Table (Notes.Last).Pragma_Source_File := Get_File_Name (Lower => True); else Notes.Table (Notes.Last).Pragma_Source_File := Units.Table (Units.Last).Sfile; end if; if At_Eol then Notes.Table (Notes.Last).Pragma_Args := No_Name; else -- Note: can't use Get_Name here as the remainder of the -- line is unstructured text whose syntax depends on the -- particular pragma used. Checkc (' '); Name_Len := 0; while not At_Eol loop Add_Char_To_Name_Buffer (Getc); end loop; end if; Skip_Eol; end if; C := Getc; end loop Notes_Loop; end loop U_Loop; -- End loop through units for one ALI file ALIs.Table (Id).Last_Unit := Units.Last; ALIs.Table (Id).Sfile := Units.Table (ALIs.Table (Id).First_Unit).Sfile; -- Set types of the units (there can be at most 2 of them) if ALIs.Table (Id).First_Unit /= ALIs.Table (Id).Last_Unit then Units.Table (ALIs.Table (Id).First_Unit).Utype := Is_Body; Units.Table (ALIs.Table (Id).Last_Unit).Utype := Is_Spec; else -- Deal with body only and spec only cases, note that the reason we -- do our own checking of the name (rather than using Is_Body_Name) -- is that Uname drags in far too much compiler junk. Get_Name_String (Units.Table (Units.Last).Uname); if Name_Buffer (Name_Len) = 'b' then Units.Table (Units.Last).Utype := Is_Body_Only; else Units.Table (Units.Last).Utype := Is_Spec_Only; end if; end if; -- Scan out external version references and put in hash table E_Loop : loop Check_Unknown_Line; exit E_Loop when C /= 'E'; if Ignore ('E') then Skip_Line; else Checkc (' '); Skip_Space; Name_Len := 0; Name_Len := 0; loop C := Getc; if C < ' ' then Fatal_Error; end if; exit when At_End_Of_Field; Add_Char_To_Name_Buffer (C); end loop; Version_Ref.Set (new String'(Name_Buffer (1 .. Name_Len)), True); Skip_Eol; end if; C := Getc; end loop E_Loop; -- Scan out source dependency lines for this ALI file ALIs.Table (Id).First_Sdep := Sdep.Last + 1; D_Loop : loop Check_Unknown_Line; exit D_Loop when C /= 'D'; if Ignore ('D') then Skip_Line; else Checkc (' '); Skip_Space; Sdep.Increment_Last; -- The file/path name may be quoted Sdep.Table (Sdep.Last).Sfile := Get_File_Name (Lower => True, May_Be_Quoted => True); Sdep.Table (Sdep.Last).Stamp := Get_Stamp; Sdep.Table (Sdep.Last).Dummy_Entry := (Sdep.Table (Sdep.Last).Stamp = Dummy_Time_Stamp); -- Acquire checksum value Skip_Space; declare Ctr : Natural; Chk : Word; begin Ctr := 0; Chk := 0; loop exit when At_Eol or else Ctr = 8; if Nextc in '0' .. '9' then Chk := Chk * 16 + Character'Pos (Nextc) - Character'Pos ('0'); elsif Nextc in 'a' .. 'f' then Chk := Chk * 16 + Character'Pos (Nextc) - Character'Pos ('a') + 10; else exit; end if; Ctr := Ctr + 1; P := P + 1; end loop; if Ctr = 8 and then At_End_Of_Field then Sdep.Table (Sdep.Last).Checksum := Chk; else Fatal_Error; end if; end; -- Acquire (sub)unit and reference file name entries Sdep.Table (Sdep.Last).Subunit_Name := No_Name; Sdep.Table (Sdep.Last).Unit_Name := No_Name; Sdep.Table (Sdep.Last).Rfile := Sdep.Table (Sdep.Last).Sfile; Sdep.Table (Sdep.Last).Start_Line := 1; if not At_Eol then Skip_Space; -- Here for (sub)unit name if Nextc not in '0' .. '9' then Name_Len := 0; while not At_End_Of_Field loop Add_Char_To_Name_Buffer (Getc); end loop; -- Set the (sub)unit name. Note that we use Name_Find rather -- than Name_Enter here as the subunit name may already -- have been put in the name table by the Project Manager. if Name_Len <= 2 or else Name_Buffer (Name_Len - 1) /= '%' then Sdep.Table (Sdep.Last).Subunit_Name := Name_Find; else Name_Len := Name_Len - 2; Sdep.Table (Sdep.Last).Unit_Name := Name_Find; end if; Skip_Space; end if; -- Here for reference file name entry if Nextc in '0' .. '9' then Sdep.Table (Sdep.Last).Start_Line := Get_Nat; Checkc (':'); Name_Len := 0; while not At_End_Of_Field loop Add_Char_To_Name_Buffer (Getc); end loop; Sdep.Table (Sdep.Last).Rfile := Name_Enter; end if; end if; Skip_Eol; end if; C := Getc; end loop D_Loop; ALIs.Table (Id).Last_Sdep := Sdep.Last; -- Loop through invocation-graph lines G_Loop : loop Check_Unknown_Line; exit G_Loop when C /= 'G'; Scan_Invocation_Graph_Line; C := Getc; end loop G_Loop; -- We must at this stage be at an Xref line or the end of file if C = EOF then return Id; end if; Check_Unknown_Line; if C /= 'X' then Fatal_Error; end if; -- This ALI parser does not care about Xref lines. return Id; exception when Bad_ALI_Format => return No_ALI_Id; end Scan_ALI; -------------- -- IS_Scope -- -------------- function IS_Scope (IS_Id : Invocation_Signature_Id) return Name_Id is begin pragma Assert (Present (IS_Id)); return Invocation_Signatures.Table (IS_Id).Scope; end IS_Scope; --------- -- SEq -- --------- function SEq (F1, F2 : String_Ptr) return Boolean is begin return F1.all = F2.all; end SEq; ----------------------------------- -- Set_Invocation_Graph_Encoding -- ----------------------------------- procedure Set_Invocation_Graph_Encoding (Kind : Invocation_Graph_Encoding_Kind; Update_Units : Boolean := True) is begin Compile_Time_Invocation_Graph_Encoding := Kind; -- Update the invocation-graph encoding of the current unit only when -- requested by the caller. if Update_Units then declare Curr_Unit : Unit_Record renames Units.Table (Units.Last); Curr_ALI : ALIs_Record renames ALIs.Table (Curr_Unit.My_ALI); begin Curr_ALI.Invocation_Graph_Encoding := Kind; end; end if; end Set_Invocation_Graph_Encoding; ----------- -- SHash -- ----------- function SHash (S : String_Ptr) return Vindex is H : Word; begin H := 0; for J in S.all'Range loop H := H * 2 + Character'Pos (S (J)); end loop; return Vindex (Vindex'First + Vindex (H mod Vindex'Range_Length)); end SHash; --------------- -- Signature -- --------------- function Signature (IC_Id : Invocation_Construct_Id) return Invocation_Signature_Id is begin pragma Assert (Present (IC_Id)); return Invocation_Constructs.Table (IC_Id).Signature; end Signature; -------------------- -- Spec_Placement -- -------------------- function Spec_Placement (IC_Id : Invocation_Construct_Id) return Declaration_Placement_Kind is begin pragma Assert (Present (IC_Id)); return Invocation_Constructs.Table (IC_Id).Spec_Placement; end Spec_Placement; ------------ -- Target -- ------------ function Target (IR_Id : Invocation_Relation_Id) return Invocation_Signature_Id is begin pragma Assert (Present (IR_Id)); return Invocation_Relations.Table (IR_Id).Target; end Target; end ALI;
zhmu/ananas
Ada
193
adb
-- { dg-do compile } with Interface9_Root.Child; procedure Interface9 is package R is new Interface9_Root (Real => Float); package RC is new R.Child; begin null; end Interface9;
Feqzz/diffie-hellman-key-exchange
Ada
4,116
adb
with Ada.Text_IO; with Ada.Integer_Text_IO; with Ada.Strings.Unbounded; with Ada.Strings.Fixed; with Ada.Command_Line; procedure Main is generator: Natural; prime : Natural; alicePrivateKey : Natural; bobPrivateKey : Natural; --------------------- -- DecimalToBinary -- --------------------- function DecimalToBinary (N : Natural) return String is ret : Ada.Strings.Unbounded.Unbounded_String; begin if N < 2 then return "1"; else Ada.Strings.Unbounded.Append(ret, Ada.Strings.Unbounded.To_Unbounded_String(decimalToBinary (N / 2))); Ada.Strings.Unbounded.Append(ret, Ada.Strings.Fixed.Trim(Integer'Image(N mod 2), Ada.Strings.Left)); end if; return Ada.Strings.Unbounded.To_String(ret); end decimalToBinary; ------------------------------- -- FastModularExponentiation -- ------------------------------- function FastModularExponentiation (b, exp, m : Natural) return Integer is x : Integer := 1; power : Integer; str : String := DecimalToBinary (exp); begin power := b mod m; for i in 0 .. (str'Length - 1) loop if str(str'Last - i) = '1' then x := (x * power) mod m; end if; power := (power*power) mod m; end loop; return x; end FastModularExponentiation; ----------- -- Power -- ----------- function Power (privateKey, g, n : Integer) return Integer is begin if privateKey = 1 then return 1; end if; return FastModularExponentiation (g, privateKey, n); end Power; ------------------- -- IsPrimeNumber -- ------------------- function IsPrimeNumber (N : Natural) return Boolean is isPrime : Boolean := true; begin if N = 0 or N = 1 then return false; end if; for i in 1 .. N / 2 loop if (N mod (i + 1)) = 0 then isPrime := false; exit; end if; end loop; return isPrime; end IsPrimeNumber; begin Ada.Integer_Text_IO.Default_Width := 0; if Ada.Command_Line.Argument_Count < 1 then Ada.Text_IO.Put_Line("You forgot to pass in all the arguments! Try --help."); return; end if; if Ada.Command_Line.Argument(1) = "--help" then Ada.Text_IO.Put_Line("Argument order: Alice, Bob, Generator, Prime"); return; end if; if Ada.Command_Line.Argument_Count < 4 then Ada.Text_IO.Put_Line("You forgot to pass in all the arguments! Try --help."); return; end if; alicePrivateKey := Integer'Value(Ada.Command_Line.Argument(1)); bobPrivateKey := Integer'Value(Ada.Command_Line.Argument(2)); generator := Integer'Value(Ada.Command_Line.Argument(3)); prime := Integer'Value(Ada.Command_Line.Argument(4)); if not IsPrimeNumber (prime) then Ada.Integer_Text_IO.Put (prime); Ada.Text_IO.Put_Line(" is not a prime number."); return; end if; Ada.Text_IO.Put ("Generator: "); Ada.Integer_Text_IO.Put (generator); Ada.Text_IO.New_Line; Ada.Text_IO.Put ("Prime Number: "); Ada.Integer_Text_IO.Put (prime); Ada.Text_IO.New_Line; Ada.Text_IO.Put ("Alice's Private Key: "); Ada.Integer_Text_IO.Put (alicePrivateKey); Ada.Text_IO.New_Line; Ada.Text_IO.Put ("Bob's Private Key: "); Ada.Integer_Text_IO.Put (bobPrivateKey); Ada.Text_IO.New_Line; Ada.Text_IO.Put ("Alice sends the message "); Ada.Integer_Text_IO.Put (Power(alicePrivateKey, generator, prime)); Ada.Text_IO.Put_Line (" to Bob."); Ada.Text_IO.Put ("Bob sends the message "); Ada.Integer_Text_IO.Put (Power(bobPrivateKey, generator, prime)); Ada.Text_IO.Put_Line (" to Alice."); Ada.Text_IO.Put ("Alice gets the secret key "); Ada.Integer_Text_IO.Put (Power(alicePrivateKey, Power(bobPrivateKey, generator, prime), prime)); Ada.Text_IO.New_Line; Ada.Text_IO.Put ("Bob gets the secret key "); Ada.Integer_Text_IO.Put (Power(bobPrivateKey, Power(alicePrivateKey, generator, prime), prime)); Ada.Text_IO.New_Line; null; end Main;
reznikmm/matreshka
Ada
4,037
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.Office_String_Value_Attributes; package Matreshka.ODF_Office.String_Value_Attributes is type Office_String_Value_Attribute_Node is new Matreshka.ODF_Office.Abstract_Office_Attribute_Node and ODF.DOM.Office_String_Value_Attributes.ODF_Office_String_Value_Attribute with null record; overriding function Create (Parameters : not null access Matreshka.DOM_Attributes.Attribute_L2_Parameters) return Office_String_Value_Attribute_Node; overriding function Get_Local_Name (Self : not null access constant Office_String_Value_Attribute_Node) return League.Strings.Universal_String; end Matreshka.ODF_Office.String_Value_Attributes;
damaki/libkeccak
Ada
2,438
ads
------------------------------------------------------------------------------- -- Copyright (c) 2016, 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.Generic_Sponge; with AUnit.Test_Fixtures; generic with package Sponge is new Keccak.Generic_Sponge (<>); Capacity : Positive; package Sponge_Tests is type Test is new AUnit.Test_Fixtures.Test_Fixture with record Ctx : Sponge.Context; end record; overriding procedure Set_Up (T : in out Test); procedure Test_Absorb_Streaming (T : in out Test); procedure Test_Squeeze_Streaming (T : in out Test); procedure Test_Absorb_No_Suffix (T : in out Test); procedure Test_Suffix_Bits (T : in out Test); procedure Test_Null_Absorb (T : in out Test); procedure Test_Absorb_Suffix_Only (T : in out Test); procedure Test_Suffix_Packing (T : in out Test); end Sponge_Tests;
zhmu/ananas
Ada
310
ads
package Opt1 is type Dimention_Length is array (1 .. 16) of Natural; type Dimension_Indexes is array (Positive range <>) of Positive; function De_Linear_Index (Index : Natural; D : Natural; Ind_Lengths : Dimention_Length) return Dimension_Indexes; end Opt1;
RREE/ada-util
Ada
2,580
adb
----------------------------------------------------------------------- -- util-beans-objects-datasets-tests -- Unit tests for dataset beans -- Copyright (C) 2013, 2015, 2017, 2021 Stephane Carrez -- Written by Stephane Carrez ([email protected]) -- -- Licensed under the Apache License, Version 2.0 (the "License"); -- you may not use this file except in compliance with the License. -- You may obtain a copy of the License at -- -- http://www.apache.org/licenses/LICENSE-2.0 -- -- Unless required by applicable law or agreed to in writing, software -- distributed under the License is distributed on an "AS IS" BASIS, -- WITHOUT WARRANTIES OR CONDITIONS OF ANY KIND, either express or implied. -- See the License for the specific language governing permissions and -- limitations under the License. ----------------------------------------------------------------------- with Util.Test_Caller; package body Util.Beans.Objects.Datasets.Tests is package Caller is new Util.Test_Caller (Test, "Beans.Datasets"); procedure Add_Tests (Suite : in Util.Tests.Access_Test_Suite) is begin Caller.Add_Test (Suite, "Test Util.Beans.Objects.Datasets", Test_Fill_Dataset'Access); end Add_Tests; -- Test the creation, initialization and retrieval of dataset content. procedure Test_Fill_Dataset (T : in out Test) is procedure Fill (Row : in out Object_Array); Set : Dataset; procedure Fill (Row : in out Object_Array) is begin Row (Row'First) := To_Object (String '("john")); Row (Row'First + 1) := To_Object (String '("[email protected]")); Row (Row'First + 2) := To_Object (Set.Get_Count); end Fill; begin Set.Add_Column ("name"); Set.Add_Column ("email"); Set.Add_Column ("age"); for I in 1 .. 100 loop Set.Append (Fill'Access); end loop; Util.Tests.Assert_Equals (T, 100, Set.Get_Count, "Invalid number of rows"); for I in 1 .. 100 loop Set.Set_Row_Index (I); declare R : constant Object := Set.Get_Row; begin T.Assert (not Is_Null (R), "Row is null"); Util.Tests.Assert_Equals (T, "john", To_String (Get_Value (R, "name")), "Invalid 'name' attribute"); Util.Tests.Assert_Equals (T, I, To_Integer (Get_Value (R, "age")), "Invalid 'age' attribute"); end; end loop; end Test_Fill_Dataset; end Util.Beans.Objects.Datasets.Tests;
DrenfongWong/tkm-rpc
Ada
1,032
ads
with Tkmrpc.Types; with Tkmrpc.Operations.Ike; package Tkmrpc.Response.Ike.Isa_Reset is Data_Size : constant := 0; Padding_Size : constant := Response.Body_Size - Data_Size; subtype Padding_Range is Natural range 1 .. Padding_Size; subtype Padding_Type is Types.Byte_Sequence (Padding_Range); type Response_Type is record Header : Response.Header_Type; Padding : Padding_Type; end record; for Response_Type use record Header at 0 range 0 .. (Response.Header_Size * 8) - 1; Padding at Response.Header_Size + Data_Size range 0 .. (Padding_Size * 8) - 1; end record; for Response_Type'Size use Response.Response_Size * 8; Null_Response : constant Response_Type := Response_Type' (Header => Response.Header_Type'(Operation => Operations.Ike.Isa_Reset, Result => Results.Invalid_Operation, Request_Id => 0), Padding => Padding_Type'(others => 0)); end Tkmrpc.Response.Ike.Isa_Reset;
faelys/natools
Ada
22,484
adb
------------------------------------------------------------------------------ -- 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. -- ------------------------------------------------------------------------------ with Ada.Strings.Fixed; with Ada.Strings.Maps; package body Natools.Getopt_Long is package Fixed renames Ada.Strings.Fixed; package Maps renames Ada.Strings.Maps; --------------------------- -- Any_Name constructors -- --------------------------- function To_Name (Long_Name : String) return Any_Name is begin return Any_Name'(Style => Long, Size => Long_Name'Length, Long => Long_Name); end To_Name; function To_Name (Short_Name : Character) return Any_Name is begin return Any_Name'(Style => Short, Size => 1, Short => Short_Name); end To_Name; function Image (Name : Any_Name) return String is begin case Name.Style is when Short => return '-' & Name.Short; when Long => return "--" & Name.Long; end case; -- Alternate implementation: -- case Name.Style is -- when Short => return String'(1 => Name.Short); -- when Long => return '"' & Name.Long & '"'; -- end case; end Image; ---------------------- -- Default handlers -- ---------------------- package body Handlers is procedure Missing_Argument (Handler : in out Callback; Id : Option_Id; Name : Any_Name) is pragma Unreferenced (Handler); pragma Unreferenced (Id); begin raise Option_Error with "Missing argument to option " & Image (Name); end Missing_Argument; procedure Unexpected_Argument (Handler : in out Callback; Id : Option_Id; Name : Any_Name; Argument : String) is pragma Unreferenced (Handler); pragma Unreferenced (Id); begin raise Option_Error with "Unexpected argument """ & Argument & """ to option " & Image (Name); end Unexpected_Argument; procedure Unknown_Option (Handler : in out Callback; Name : Any_Name) is pragma Unreferenced (Handler); begin raise Option_Error with "Unknown option " & Image (Name); end Unknown_Option; end Handlers; ------------------------------------- -- Simple configuration parameters -- ------------------------------------- function Posixly_Correct (Config : Configuration) return Boolean is begin return Config.Posixly_Correct; end Posixly_Correct; procedure Posixly_Correct (Config : in out Configuration; To : Boolean := True) is begin Config.Posixly_Correct := To; end Posixly_Correct; function Long_Only (Config : Configuration) return Boolean is begin return Config.Long_Only; end Long_Only; procedure Use_Long_Only (Config : in out Configuration; Value : Boolean := True) is begin Config.Long_Only := Value; end Use_Long_Only; ---------------------------- -- Option list management -- ---------------------------- procedure Add_Option (Config : in out Configuration; Long_Name : String; Short_Name : Character; Has_Arg : Argument_Requirement; Id : Option_Id) is New_Option : constant Option := (Long_Name_Length => Long_Name'Length, Id => Id, Has_Arg => Has_Arg, Long_Name => Long_Name, Short_Name => Short_Name); begin if Long_Name = Null_Long_Name or Short_Name = Null_Short_Name then raise Constraint_Error; end if; Config.By_Long_Name.Insert (Long_Name, New_Option); Config.By_Short_Name.Insert (Short_Name, New_Option); end Add_Option; procedure Add_Option (Config : in out Configuration; Long_Name : String; Has_Arg : Argument_Requirement; Id : Option_Id) is New_Option : constant Option := (Long_Name_Length => Long_Name'Length, Id => Id, Has_Arg => Has_Arg, Long_Name => Long_Name, Short_Name => Null_Short_Name); begin if Long_Name = Null_Long_Name then raise Constraint_Error; end if; Config.By_Long_Name.Insert (Long_Name, New_Option); end Add_Option; procedure Add_Option (Config : in out Configuration; Short_Name : Character; Has_Arg : Argument_Requirement; Id : Option_Id) is New_Option : constant Option := (Long_Name_Length => 0, Id => Id, Has_Arg => Has_Arg, Long_Name => Null_Long_Name, Short_Name => Short_Name); begin if Short_Name = Null_Short_Name then raise Constraint_Error; end if; Config.By_Short_Name.Insert (Short_Name, New_Option); end Add_Option; procedure Del_Option (Config : in out Configuration; Id : Option_Id) is Short_Name_Cursor : Short_Option_Maps.Cursor := Config.By_Short_Name.First; Long_Name_Cursor : Long_Option_Maps.Cursor := Config.By_Long_Name.First; begin while Short_Option_Maps.Has_Element (Short_Name_Cursor) loop declare Next : constant Short_Option_Maps.Cursor := Short_Option_Maps.Next (Short_Name_Cursor); begin if Short_Option_Maps.Element (Short_Name_Cursor).Id = Id then Config.By_Short_Name.Delete (Short_Name_Cursor); end if; Short_Name_Cursor := Next; end; end loop; while Long_Option_Maps.Has_Element (Long_Name_Cursor) loop declare Next : constant Long_Option_Maps.Cursor := Long_Option_Maps.Next (Long_Name_Cursor); begin if Long_Option_Maps.Element (Long_Name_Cursor).Id = Id then Config.By_Long_Name.Delete (Long_Name_Cursor); end if; Long_Name_Cursor := Next; end; end loop; end Del_Option; procedure Del_Option (Config : in out Configuration; Long_Name : String) is begin Config.By_Long_Name.Delete (Long_Name); end Del_Option; procedure Del_Option (Config : in out Configuration; Short_Name : Character) is begin Config.By_Short_Name.Delete (Short_Name); end Del_Option; ---------------------------- -- Formatting subprograms -- ---------------------------- function Format_Long_Names (Config : Configuration; Id : Option_Id; Separator : String := ", "; Name_Prefix : String := "--") return String is Long_Name_Count : constant Natural := Get_Long_Name_Count (Config, Id); Result_Length : Natural; Position : Positive; begin if Long_Name_Count = 0 then return ""; end if; Result_Length := Long_Name_Count * Name_Prefix'Length + (Long_Name_Count - 1) * Separator'Length; for J in 1 .. Long_Name_Count loop Result_Length := Result_Length + Get_Long_Name (Config, Id, J)'Length; end loop; return Result : String (1 .. Result_Length) do Position := Result'First; for J in 1 .. Long_Name_Count loop if J > 1 then Result (Position .. Position + Separator'Length - 1) := Separator; Position := Position + Separator'Length; end if; Result (Position .. Position + Name_Prefix'Length - 1) := Name_Prefix; Position := Position + Name_Prefix'Length; declare Name : constant String := Get_Long_Name (Config, Id, J); begin Result (Position .. Position + Name'Length - 1) := Name; Position := Position + Name'Length; end; end loop; end return; end Format_Long_Names; function Format_Names (Config : Configuration; Id : Option_Id; Separator : String := ", "; Long_Name_Prefix : String := "--"; Short_Name_Prefix : String := "-"; Short_First : Boolean := True) return String is Long_Names : constant String := Format_Long_Names (Config, Id, Separator, Long_Name_Prefix); Short_Names : constant String := Format_Short_Names (Config, Id, Separator, Short_Name_Prefix); begin if Long_Names = "" then return Short_Names; elsif Short_Names = "" then return Long_Names; elsif Short_First then return Short_Names & Separator & Long_Names; else return Long_Names & Separator & Short_Names; end if; end Format_Names; function Format_Short_Names (Config : Configuration; Id : Option_Id; Separator : String := ", "; Name_Prefix : String := "-") return String is Short_Names : constant String := Get_Short_Names (Config, Id); Space_Per_Name : constant Positive := Name_Prefix'Length + 1 + Separator'Length; Result : String (1 .. Short_Names'Length * Space_Per_Name); begin if Short_Names = "" then return ""; end if; for J in Short_Names'Range loop declare First : constant Positive := Result'First + (J - Short_Names'First) * Space_Per_Name; begin Result (First .. First + Name_Prefix'Length - 1) := Name_Prefix; Result (First + Name_Prefix'Length) := Short_Names (J); Result (First + Name_Prefix'Length + 1 .. First + Space_Per_Name - 1) := Separator; end; end loop; return Result (Result'First .. Result'Last - Separator'Length); end Format_Short_Names; function Get_Long_Name (Config : Configuration; Id : Option_Id; Index : Positive := 1) return String is Seen : Natural := 0; Cursor : Long_Option_Maps.Cursor := Config.By_Long_Name.First; begin while Long_Option_Maps.Has_Element (Cursor) loop declare Opt : constant Option := Long_Option_Maps.Element (Cursor); begin if Opt.Id = Id then Seen := Seen + 1; if Seen = Index then return Opt.Long_Name; end if; end if; end; Long_Option_Maps.Next (Cursor); end loop; raise Constraint_Error; end Get_Long_Name; function Get_Long_Name_Count (Config : Configuration; Id : Option_Id) return Natural is procedure Process (Key : String; Element : Option); procedure Process (Cursor : Long_Option_Maps.Cursor); Result : Natural := 0; procedure Process (Key : String; Element : Option) is pragma Unreferenced (Key); begin if Element.Id = Id then Result := Result + 1; end if; end Process; procedure Process (Cursor : Long_Option_Maps.Cursor) is begin Long_Option_Maps.Query_Element (Cursor, Process'Access); end Process; begin Config.By_Long_Name.Iterate (Process'Access); return Result; end Get_Long_Name_Count; function Get_Short_Name_Count (Config : Configuration; Id : Option_Id) return Natural is procedure Process (Key : Character; Element : Option); procedure Process (Cursor : Short_Option_Maps.Cursor); Result : Natural := 0; procedure Process (Key : Character; Element : Option) is pragma Unreferenced (Key); begin if Element.Id = Id then Result := Result + 1; end if; end Process; procedure Process (Cursor : Short_Option_Maps.Cursor) is begin Short_Option_Maps.Query_Element (Cursor, Process'Access); end Process; begin Config.By_Short_Name.Iterate (Process'Access); return Result; end Get_Short_Name_Count; function Get_Short_Names (Config : Configuration; Id : Option_Id) return String is procedure Process (Key : Character; Element : Option); procedure Process (Cursor : Short_Option_Maps.Cursor); Result : String (1 .. Config.Get_Short_Name_Count (Id)); J : Positive := Result'First; procedure Process (Key : Character; Element : Option) is begin if Element.Id = Id then Result (J) := Key; J := J + 1; end if; end Process; procedure Process (Cursor : Short_Option_Maps.Cursor) is begin Short_Option_Maps.Query_Element (Cursor, Process'Access); end Process; begin Config.By_Short_Name.Iterate (Process'Access); return Result; end Get_Short_Names; procedure Iterate (Config : Configuration; Process : not null access procedure (Id : Option_Id; Long_Name : String; Short_Name : Character; Has_Arg : Argument_Requirement)) is procedure Long_Process (Key : String; Opt : Option); procedure Long_Query (C : Long_Option_Maps.Cursor); procedure Short_Process (Key : Character; Opt : Option); procedure Short_Query (C : Short_Option_Maps.Cursor); procedure Long_Process (Key : String; Opt : Option) is pragma Unreferenced (Key); begin if Opt.Short_Name = Null_Short_Name then Process (Opt.Id, Opt.Long_Name, Opt.Short_Name, Opt.Has_Arg); end if; end Long_Process; procedure Long_Query (C : Long_Option_Maps.Cursor) is begin Long_Option_Maps.Query_Element (C, Long_Process'Access); end Long_Query; procedure Short_Process (Key : Character; Opt : Option) is pragma Unreferenced (Key); begin Process (Opt.Id, Opt.Long_Name, Opt.Short_Name, Opt.Has_Arg); end Short_Process; procedure Short_Query (C : Short_Option_Maps.Cursor) is begin Short_Option_Maps.Query_Element (C, Short_Process'Access); end Short_Query; begin Config.By_Short_Name.Iterate (Short_Query'Access); Config.By_Long_Name.Iterate (Long_Query'Access); end Iterate; ----------------------------- -- Command-line processing -- ----------------------------- procedure Process (Config : Configuration; Handler : in out Handlers.Callback'Class; Argument_Count : not null access function return Natural := Ada.Command_Line.Argument_Count'Access; Argument : not null access function (Number : Positive) return String := Ada.Command_Line.Argument'Access) is procedure Process_Long_Option (Arg : String); Arg_Count : constant Natural := Argument_Count.all; Arg_N : Positive := 1; procedure Process_Long_Option (Arg : String) is function Has_Prefix (C : Long_Option_Maps.Cursor; Prefix : String) return Boolean; Equal : constant Natural := Fixed.Index (Arg, Maps.To_Set ('=')); Cursor : Long_Option_Maps.Cursor; Arg_Name_Last : Natural := Arg'Last; function Has_Prefix (C : Long_Option_Maps.Cursor; Prefix : String) return Boolean is Key : constant String := Long_Option_Maps.Key (C); begin return Key'Length >= Prefix'Length and then Key (1 .. Prefix'Length) = Prefix; end Has_Prefix; begin if Equal /= 0 then Arg_Name_Last := Equal - 1; end if; declare Arg_Name : String renames Arg (Arg'First .. Arg_Name_Last); begin -- Looking for an exact match Cursor := Config.By_Long_Name.Find (Arg_Name); if not Long_Option_Maps.Has_Element (Cursor) then -- Looking for a unique partial match Cursor := Config.By_Long_Name.Ceiling (Arg_Name); if not Long_Option_Maps.Has_Element (Cursor) or else not Has_Prefix (Cursor, Arg_Name) or else Has_Prefix (Long_Option_Maps.Next (Cursor), Arg_Name) then Handler.Unknown_Option (To_Name (Arg_Name)); return; end if; end if; -- At this point, Cursor points to the selected argument declare Opt : constant Option := Long_Option_Maps.Element (Cursor); begin case Opt.Has_Arg is when No_Argument => if Equal = 0 then Handler.Option (Opt.Id, ""); else Handler.Unexpected_Argument (Opt.Id, To_Name (Opt.Long_Name), Arg (Equal + 1 .. Arg'Last)); end if; when Optional_Argument => if Equal = 0 then Handler.Option (Opt.Id, ""); else Handler.Option (Opt.Id, Arg (Equal + 1 .. Arg'Last)); end if; when Required_Argument => if Equal = 0 then if Arg_N = Arg_Count then Handler.Missing_Argument (Opt.Id, To_Name (Opt.Long_Name)); else Handler.Option (Opt.Id, Argument (Arg_N + 1)); Arg_N := Arg_N + 1; end if; else Handler.Option (Opt.Id, Arg (Equal + 1 .. Arg'Last)); end if; end case; end; end; end Process_Long_Option; begin while Arg_N <= Arg_Count loop declare Arg : constant String := Argument (Arg_N); begin if Arg'Length <= 1 or else Arg (Arg'First) /= '-' then -- This is a non-flag argument, abort option processing if -- posixly correct. if Config.Posixly_Correct then exit; else Handler.Argument (Arg); Arg_N := Arg_N + 1; end if; elsif Arg (Arg'First + 1) = '-' then -- "--" stops option processing. if Arg'Length = 2 then Arg_N := Arg_N + 1; exit; end if; -- Argument starting with "--": long option. Process_Long_Option (Arg (Arg'First + 2 .. Arg'Last)); Arg_N := Arg_N + 1; elsif Config.Long_Only then -- Force long option on a single dash prefix. Process_Long_Option (Arg (Arg'First + 1 .. Arg'Last)); Arg_N := Arg_N + 1; else -- Process a list of short options, until one with required -- argument is encountered (and the rest is its argument). for Arg_I in Arg'First + 1 .. Arg'Last loop declare Cursor : constant Short_Option_Maps.Cursor := Config.By_Short_Name.Find (Arg (Arg_I)); begin if Short_Option_Maps.Has_Element (Cursor) then declare Opt : constant Option := Short_Option_Maps.Element (Cursor); begin if Opt.Has_Arg = Required_Argument then if Arg_I = Arg'Last then if Arg_N = Arg_Count then Handler.Missing_Argument (Opt.Id, To_Name (Opt.Short_Name)); else Handler.Option (Opt.Id, Argument (Arg_N + 1)); Arg_N := Arg_N + 1; exit; end if; else Handler.Option (Opt.Id, Arg (Arg_I + 1 .. Arg'Last)); exit; end if; else Handler.Option (Opt.Id, ""); end if; end; else Handler.Unknown_Option (To_Name (Arg (Arg_I))); end if; end; end loop; Arg_N := Arg_N + 1; end if; end; end loop; -- Only non-flag arguments remain while Arg_N <= Arg_Count loop Handler.Argument (Argument (Arg_N)); Arg_N := Arg_N + 1; end loop; end Process; end Natools.Getopt_Long;
charlie5/cBound
Ada
1,743
ads
-- This file is generated by SWIG. Please do not modify by hand. -- with Interfaces; with Interfaces.C; with Interfaces.C.Pointers; package xcb.xcb_get_image_request_t is -- Item -- type Item is record major_opcode : aliased Interfaces.Unsigned_8; format : aliased Interfaces.Unsigned_8; length : aliased Interfaces.Unsigned_16; drawable : aliased xcb.xcb_drawable_t; x : aliased Interfaces.Integer_16; y : aliased Interfaces.Integer_16; width : aliased Interfaces.Unsigned_16; height : aliased Interfaces.Unsigned_16; plane_mask : aliased Interfaces.Unsigned_32; end record; -- Item_Array -- type Item_Array is array (Interfaces.C.size_t range <>) of aliased xcb.xcb_get_image_request_t .Item; -- Pointer -- package C_Pointers is new Interfaces.C.Pointers (Index => Interfaces.C.size_t, Element => xcb.xcb_get_image_request_t.Item, Element_Array => xcb.xcb_get_image_request_t.Item_Array, Default_Terminator => (others => <>)); subtype Pointer is C_Pointers.Pointer; -- Pointer_Array -- type Pointer_Array is array (Interfaces.C.size_t range <>) of aliased xcb.xcb_get_image_request_t .Pointer; -- Pointer_Pointer -- package C_Pointer_Pointers is new Interfaces.C.Pointers (Index => Interfaces.C.size_t, Element => xcb.xcb_get_image_request_t.Pointer, Element_Array => xcb.xcb_get_image_request_t.Pointer_Array, Default_Terminator => null); subtype Pointer_Pointer is C_Pointer_Pointers.Pointer; end xcb.xcb_get_image_request_t;
reznikmm/matreshka
Ada
4,904
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.Visitors; with ODF.DOM.Text_Linenumbering_Configuration_Elements; package Matreshka.ODF_Text.Linenumbering_Configuration_Elements is type Text_Linenumbering_Configuration_Element_Node is new Matreshka.ODF_Text.Abstract_Text_Element_Node and ODF.DOM.Text_Linenumbering_Configuration_Elements.ODF_Text_Linenumbering_Configuration with null record; overriding function Create (Parameters : not null access Matreshka.DOM_Elements.Element_L2_Parameters) return Text_Linenumbering_Configuration_Element_Node; overriding function Get_Local_Name (Self : not null access constant Text_Linenumbering_Configuration_Element_Node) return League.Strings.Universal_String; overriding procedure Enter_Node (Self : not null access Text_Linenumbering_Configuration_Element_Node; Visitor : in out XML.DOM.Visitors.Abstract_Visitor'Class; Control : in out XML.DOM.Visitors.Traverse_Control); overriding procedure Leave_Node (Self : not null access Text_Linenumbering_Configuration_Element_Node; Visitor : in out XML.DOM.Visitors.Abstract_Visitor'Class; Control : in out XML.DOM.Visitors.Traverse_Control); overriding procedure Visit_Node (Self : not null access Text_Linenumbering_Configuration_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); end Matreshka.ODF_Text.Linenumbering_Configuration_Elements;
AdaCore/Ada_Drivers_Library
Ada
707
adb
with Ada.Text_IO; use Ada.Text_IO; with Command_Line; procedure TC_CMD_Builtins is Cmd_1 : aliased constant String := "help"; Cmd_2 : aliased constant String := "help echo"; Cmd_3 : aliased constant String := "echo -n test"; Cmd_4 : aliased constant String := "echo test"; begin Ada.Text_IO.Put_Line ("$ " & Cmd_1); Command_Line.Run (Cmd_1, Put'Access, Put_Line'Access); Ada.Text_IO.Put_Line ("$ " & Cmd_2); Command_Line.Run (Cmd_2, Put'Access, Put_Line'Access); Ada.Text_IO.Put_Line ("$ " & Cmd_3); Command_Line.Run (Cmd_3, Put'Access, Put_Line'Access); Ada.Text_IO.Put_Line ("$ " & Cmd_4); Command_Line.Run (Cmd_4, Put'Access, Put_Line'Access); end TC_CMD_Builtins;
onox/orka
Ada
6,148
adb
-- SPDX-License-Identifier: Apache-2.0 -- -- Copyright (c) 2012 Felix Krause <[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 GL.API.Uniforms.Singles; with GL.API.Uniforms.Doubles; with GL.API.Uniforms.Ints; with GL.API.Uniforms.UInts; with GL.Low_Level; package body GL.Objects.Programs.Uniforms is function Create_Uniform (Object : Program; Location : Int) return Uniform is begin return Uniform'(Program => Object, Location => Location); end Create_Uniform; ----------------------------------------------------------------------------- -- Singles -- ----------------------------------------------------------------------------- procedure Set_Single (Location : Uniform; Value : Single) is begin API.Uniforms.Singles.Uniform1.Ref (Location.Program.Reference.GL_Id, Location.Location, Value); end Set_Single; procedure Set_Single_Vector (Location : Uniform; Value : Singles.Vector2) is begin API.Uniforms.Singles.Uniform2v.Ref (Location.Program.Reference.GL_Id, Location.Location, 1, (1 => Value)); end Set_Single_Vector; procedure Set_Single_Vector (Location : Uniform; Value : Singles.Vector3) is begin API.Uniforms.Singles.Uniform3v.Ref (Location.Program.Reference.GL_Id, Location.Location, 1, (1 => Value)); end Set_Single_Vector; procedure Set_Single_Vector (Location : Uniform; Value : Singles.Vector4) is begin API.Uniforms.Singles.Uniform4v.Ref (Location.Program.Reference.GL_Id, Location.Location, 1, (1 => Value)); end Set_Single_Vector; procedure Set_Single_Matrix (Location : Uniform; Value : Singles.Matrix4) is begin API.Uniforms.Singles.Uniform_Matrix4.Ref (Location.Program.Reference.GL_Id, Location.Location, 1, Low_Level.False, (1 => Value)); end Set_Single_Matrix; ----------------------------------------------------------------------------- -- Doubles -- ----------------------------------------------------------------------------- procedure Set_Double (Location : Uniform; Value : Double) is begin API.Uniforms.Doubles.Uniform1.Ref (Location.Program.Reference.GL_Id, Location.Location, Value); end Set_Double; procedure Set_Double_Vector (Location : Uniform; Value : Doubles.Vector2) is begin API.Uniforms.Doubles.Uniform2v.Ref (Location.Program.Reference.GL_Id, Location.Location, 1, (1 => Value)); end Set_Double_Vector; procedure Set_Double_Vector (Location : Uniform; Value : Doubles.Vector3) is begin API.Uniforms.Doubles.Uniform3v.Ref (Location.Program.Reference.GL_Id, Location.Location, 1, (1 => Value)); end Set_Double_Vector; procedure Set_Double_Vector (Location : Uniform; Value : Doubles.Vector4) is begin API.Uniforms.Doubles.Uniform4v.Ref (Location.Program.Reference.GL_Id, Location.Location, 1, (1 => Value)); end Set_Double_Vector; procedure Set_Double_Matrix (Location : Uniform; Value : Doubles.Matrix4) is begin API.Uniforms.Doubles.Uniform_Matrix4.Ref (Location.Program.Reference.GL_Id, Location.Location, 1, Low_Level.False, (1 => Value)); end Set_Double_Matrix; ----------------------------------------------------------------------------- -- Integers -- ----------------------------------------------------------------------------- procedure Set_Int (Location : Uniform; Value : Int) is begin API.Uniforms.Ints.Uniform1.Ref (Location.Program.Reference.GL_Id, Location.Location, Value); end Set_Int; procedure Set_Int_Vector (Location : Uniform; Value : Ints.Vector2) is begin API.Uniforms.Ints.Uniform2v.Ref (Location.Program.Reference.GL_Id, Location.Location, 1, (1 => Value)); end Set_Int_Vector; procedure Set_Int_Vector (Location : Uniform; Value : Ints.Vector3) is begin API.Uniforms.Ints.Uniform3v.Ref (Location.Program.Reference.GL_Id, Location.Location, 1, (1 => Value)); end Set_Int_Vector; procedure Set_Int_Vector (Location : Uniform; Value : Ints.Vector4) is begin API.Uniforms.Ints.Uniform4v.Ref (Location.Program.Reference.GL_Id, Location.Location, 1, (1 => Value)); end Set_Int_Vector; ----------------------------------------------------------------------------- -- Unsigned Integers -- ----------------------------------------------------------------------------- procedure Set_UInt (Location : Uniform; Value : UInt) is begin API.Uniforms.UInts.Uniform1.Ref (Location.Program.Reference.GL_Id, Location.Location, Value); end Set_UInt; procedure Set_UInt_Vector (Location : Uniform; Value : UInts.Vector2) is begin API.Uniforms.UInts.Uniform2v.Ref (Location.Program.Reference.GL_Id, Location.Location, 1, (1 => Value)); end Set_UInt_Vector; procedure Set_UInt_Vector (Location : Uniform; Value : UInts.Vector3) is begin API.Uniforms.UInts.Uniform3v.Ref (Location.Program.Reference.GL_Id, Location.Location, 1, (1 => Value)); end Set_UInt_Vector; procedure Set_UInt_Vector (Location : Uniform; Value : UInts.Vector4) is begin API.Uniforms.UInts.Uniform4v.Ref (Location.Program.Reference.GL_Id, Location.Location, 1, (1 => Value)); end Set_UInt_Vector; end GL.Objects.Programs.Uniforms;
AdaCore/gpr
Ada
3,048
ads
-- -- Copyright (C) 2019-2023, AdaCore -- -- SPDX-License-Identifier: Apache-2.0 WITH LLVM-Exception -- -- Pretty Printer for a GPR2 project with Gpr_Parser.Analysis; with GPR2.Project.View; package GPR2.Project.Pretty_Printer is use Gpr_Parser; use Gpr_Parser.Analysis; type Object is tagged private; subtype Line_Length is Positive range 50 .. 255; function Create (With_Comments : Boolean := True; Initial_Indent : Natural := 0; Increment : Positive := 3; Max_Line_Length : Line_Length := 80; Minimize_Empty_Lines : Boolean := False; Backward_Compatibility : Boolean := False) return Object; -- Creates a pretty-printer object. -- -- Initial_Indent is the initial indentation. -- -- Increment is the number of spaces for each indentation level. -- -- Max_Line_Length is the maximum line length in the project file -- -- If Minimize_Empty_Lines is True, empty lines will be output only after -- the last with clause, after the line declaring the project name, after -- the last declarative item of the project and before each package -- declaration. Otherwise, more empty lines are output. -- -- If Backward_Compatibility is True, then new attributes (Spec, -- Spec_Suffix, Body, Body_Suffix) will be replaced by obsolete ones -- (Specification, Specification_Suffix, Implementation, -- Implementation_Suffix). procedure Pretty_Print (Self : in out Object; View : Project.View.Object := Project.View.Undefined; Analysis_Unit : Analysis.Analysis_Unit := No_Analysis_Unit; Write_Character : access procedure (C : Character) := null; Write_String : access procedure (S : String) := null; Write_EOL : access procedure := null) with Pre => (View.Is_Defined or else Analysis_Unit /= No_Analysis_Unit) and then ((Write_Character = null and then Write_String = null and then Write_EOL = null) or else (Write_Character /= null and then Write_String /= null and then Write_EOL /= null)); -- Pretty prints the project, either uses the specified Write_* procedures, -- or creates string representation in memory. function Result (Self : Object) return String; -- Returns the result of the pretty printer private type Object is tagged record With_Comments : Boolean := True; Initial_Indent : Natural := 0; Increment : Positive := 3; Max_Line_Length : Line_Length := 80; Minimize_Empty_Lines : Boolean := False; Backward_Compatibility : Boolean := False; Buffer : Unbounded_String; end record; end GPR2.Project.Pretty_Printer;
burratoo/Acton
Ada
5,472
ads
------------------------------------------------------------------------------------------ -- -- -- OAK COMPONENTS -- -- -- -- OAK.STORAGE.TIME_PRIORITY_QUEUE -- -- -- -- Copyright (C) 2013-2021, Patrick Bernardi -- -- -- ------------------------------------------------------------------------------------------ generic type Item_Type is private; pragma Preelaborable_Initialization (Item_Type); type Index_Type is mod <>; -- Index_Type is mod so it can pack the most elements in the smallest -- base type. type Priority_Type is range <>; No_Item : Item_Type; with function "<" (Left, Right : Item_Type) return Boolean is <>; with function Priority (Element : in Item_Type) return Priority_Type; package Oak.Storage.Time_Priority_Queue with Pure is Queue_Capacity_Error : exception; type Queue_Type is private with Preelaborable_Initialization; procedure Enqueue_Item (To_Queue : in out Queue_Type; Item : in Item_Type); -- Adds an item to the priority queue function Find_Earliest_Item (In_Queue : in Queue_Type; Above_Priority : in Priority_Type := Priority_Type'First) return Item_Type; -- Finds the earliest/smallest item in the pool above the given priority. -- Returns No_Item if there is no item found. function Head_Of_Queue (From_Queue : in out Queue_Type) return Item_Type; procedure Remove_Queue_Head (From_Queue : in out Queue_Type; Item : out Item_Type); -- Removes the first item from the priority queue. Returns an empty element -- if the queue is empty. function Is_Queue_Full (Queue : in Queue_Type) return Boolean; private No_Node_Value : constant := 0; First_Node_Value : constant := No_Node_Value + 1; -- The constant that represents the No_Node. Needed to satisfy the -- preelaborable initialization constraints on the types below. ??? Should -- check to see if there is a bug in the compiler preventing the direct use -- of No_Node. No_Node : constant Index_Type := No_Node_Value; -- The Index_Type that represents the null node, or that no node exists -- at all. First_Priority : constant Priority_Type := Priority_Type'First; -- Constant for the first priority. type Node_Colour is (Red, Black); -- Colour of a node in the red-black tree. type Node_Type is record -- This type represents a Node in the tree. Each node has a link to its -- parent to allow a bottom-up transversal of the tree without using -- recursion. Its presence does not impact of the effective size of the -- node if the Node_Location and priority types' base type is a byte. On a -- 32 bit aligned system should be able to pack the infrustructure -- components into just two registers, or two 32 bit words in memory, with -- two bytes free. Colour : Node_Colour := Black; Parent : Index_Type := No_Node_Value; Left, Right : Index_Type := No_Node_Value; Left_Priority : Priority_Type := Priority_Type'First; Right_Priority : Priority_Type := Priority_Type'First; -- Left and right subtree priorities are store seperately so we do not -- have to access the child nodes just so we can determine which path to -- take. Item : Item_Type; end record; type Node_Array is array (Index_Type) of Node_Type; type Queue_Type is record -- This type represents the set which is actually a red-black tree. Root : Index_Type := No_Node_Value; -- The node pointing to the root of the tree. Free_List : Index_Type := No_Node_Value; -- The first node in the free list. This list consists of free nodes -- that are not part of the bulk free store of the array, since they -- have been allocated and subsquently deallocated. -- -- No_Node means the list is empty. Bulk_Free : Index_Type := First_Node_Value; -- The first node in the bulk free store. This is the free area on the -- right side of the array that has not been allocate. The bulk store -- saves from having to populate the free list in the first place, which -- may be an expensive operation (it is an O (n) operation). -- -- No_Node means bulk free store is empty. First_Node : Index_Type := No_Node_Value; First_Node_Valid : Boolean := False; -- Caches the first node in the priority queue. Nodes : Node_Array; -- The node pool. The first node is the No_Node which needs to be -- initialised here. end record; -------------------------- -- Function Expressions -- -------------------------- function Is_Queue_Full (Queue : in Queue_Type) return Boolean is (Queue.Free_List = No_Node and Queue.Bulk_Free = No_Node); end Oak.Storage.Time_Priority_Queue;
reznikmm/matreshka
Ada
5,316
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. ------------------------------------------------------------------------------ -- A decision node is a control node that chooses between outgoing flows. ------------------------------------------------------------------------------ limited with AMF.UML.Behaviors; with AMF.UML.Control_Nodes; limited with AMF.UML.Object_Flows; package AMF.UML.Decision_Nodes is pragma Preelaborate; type UML_Decision_Node is limited interface and AMF.UML.Control_Nodes.UML_Control_Node; type UML_Decision_Node_Access is access all UML_Decision_Node'Class; for UML_Decision_Node_Access'Storage_Size use 0; not overriding function Get_Decision_Input (Self : not null access constant UML_Decision_Node) return AMF.UML.Behaviors.UML_Behavior_Access is abstract; -- Getter of DecisionNode::decisionInput. -- -- Provides input to guard specifications on edges outgoing from the -- decision node. not overriding procedure Set_Decision_Input (Self : not null access UML_Decision_Node; To : AMF.UML.Behaviors.UML_Behavior_Access) is abstract; -- Setter of DecisionNode::decisionInput. -- -- Provides input to guard specifications on edges outgoing from the -- decision node. not overriding function Get_Decision_Input_Flow (Self : not null access constant UML_Decision_Node) return AMF.UML.Object_Flows.UML_Object_Flow_Access is abstract; -- Getter of DecisionNode::decisionInputFlow. -- -- An additional edge incoming to the decision node that provides a -- decision input value. not overriding procedure Set_Decision_Input_Flow (Self : not null access UML_Decision_Node; To : AMF.UML.Object_Flows.UML_Object_Flow_Access) is abstract; -- Setter of DecisionNode::decisionInputFlow. -- -- An additional edge incoming to the decision node that provides a -- decision input value. end AMF.UML.Decision_Nodes;
clairvoyant/anagram
Ada
544
ads
-- Copyright (c) 2010-2017 Maxim Reznik <[email protected]> -- -- SPDX-License-Identifier: MIT -- License-Filename: LICENSE ------------------------------------------------------------- package Anagram.Grammars.Reader is function Read (File_Name : String; Tail_List : Boolean := False) return Anagram.Grammars.Grammar; -- If Tail_List is False then a list expanded as -- LIST ::= [LIST] <head> Item -- If Tail_List is True then a list expanded as -- LIST ::= Item [LIST] <tail> end Anagram.Grammars.Reader;
AdaCore/training_material
Ada
851
ads
package Employee is type Person_T is tagged private; -- create primitive subprograms to set/get attributes for Person_T and -- to print the contents of Person_T procedure Set_Attribute (O : in out Person_T; Value : String); function Get_Attribute (O : Person_T) return String; procedure Print (O : Person_T); -- Create a new type Employee_T based on Person with some -- additional attributes -- Create primitive subprograms to set/get these new attributes and to -- print the entire contents of Employee_T -- Create a new type Position_T based on Person with some -- additional attributes -- Create primitive subprograms to set/get these new attributes and to -- print the entire contents of Position_T private type Person_T is tagged null record; end Employee;
persan/protobuf-ada
Ada
2,698
ads
with protobuf_unittest.TestAllTypes; with protobuf_unittest.TestPackedTypes; with protobuf_unittest.TestUnpackedTypes; with GNAT.Source_Info; package Test_Util is -- Set every field in the message to a unique value. procedure Set_All_Fields (Message : in out protobuf_unittest.TestAllTypes.Instance); procedure Set_Optional_Fields (Message : in out protobuf_unittest.TestAllTypes.Instance); procedure Add_Repeated_Fields1 (Message : in out protobuf_unittest.TestAllTypes.Instance); procedure Add_Repeated_Fields2 (Message : in out protobuf_unittest.TestAllTypes.Instance); procedure Set_Default_Fields (Message : in out protobuf_unittest.TestAllTypes.Instance); procedure Set_Unpacked_Fields (Message : in out protobuf_unittest.TestUnpackedTypes.Instance); procedure Set_Packed_Fields (Message : in out protobuf_unittest.TestPackedTypes.Instance); -- Use the repeated versions of the Set_*(...) accessors to modify all the -- repeated fields of the message (which should already have been initialized -- with Set_*_Fields(...)). Set_*_Fields(...) itself only tests the -- Add_*(...) accessors. procedure Modify_Repeated_Fields (Message : in out protobuf_unittest.TestAllTypes.Instance); procedure Modify_Packed_Fields (Message : in out protobuf_unittest.TestPackedTypes.Instance); -- Check that all fields have the values that they should after -- Set_*_Fields(...) is called. procedure Expect_All_Fields_Set (Message : in out protobuf_unittest.TestAllTypes.Instance); procedure Expect_Packed_Fields_Set (Message : in protobuf_unittest.TestPackedTypes.Instance); procedure Expect_Unpacked_Fields_Set (Message : in protobuf_unittest.TestUnpackedTypes.Instance); -- Expect that the message is modified as would be expected from -- Modify_*_Fields(...). procedure Expect_Repeated_Fields_Modified (Message : in protobuf_unittest.TestAllTypes.Instance); procedure Expect_Packed_Fields_Modified (Message : in protobuf_unittest.TestPackedTypes.Instance); -- Check that all fields have their default values. procedure Expect_Clear (Message : in out protobuf_unittest.TestAllTypes.Instance); procedure Expect_Packed_Clear (Message : in protobuf_unittest.TestPackedTypes.Instance); -- Check that all repeated fields have had their last elements removed procedure Expect_Last_Repeateds_Removed (Message : in protobuf_unittest.TestAllTypes.Instance); procedure Expect_Last_Repeateds_Released (Message : in protobuf_unittest.TestAllTypes.Instance); procedure Expect_Repeateds_Swapped (Message : in protobuf_unittest.TestAllTypes.Instance); -- Check that all repeated fields have had their first and last elements -- swapped. end Test_Util;
AdaDoom3/wayland_ada_binding
Ada
9,757
adb
with Aida.Deepend_XML_SAX_Parser; pragma Elaborate_All (Aida.Deepend_XML_SAX_Parser); package body Aida.Deepend_XML_DOM_Parser is procedure Start_Tag (This : in out SAX_Parser_T; Tag_Name : Standard.String; Call_Result : in out Aida.Subprogram_Call_Result.T) is begin case This.State is when Expecting_Object_Start => if Tag_Name'Length > 0 and This.Current_Nodes.Is_Empty then declare Current_Node : not null Node_Ptr := new (This.Subpool) Node_T; begin Current_Node.Inner.My_Tag.My_Name := new (This.Subpool) Standard.String'(Tag_Name); This.Current_Nodes.Append (Current_Node); This.Root_Node := Current_Node; end; This.State := Expecting_Default; else Call_Result.Initialize (-2132671123, 1966624808); end if; when Expecting_Default => if Tag_Name'Length > 0 then declare Current_Node : not null Node_Ptr := new (This.Subpool) Node_T; begin Current_Node.Inner.My_Tag.My_Name := new (This.Subpool) Standard.String'(Tag_Name); if This.Current_Nodes.Constant_Reference (This.Current_Nodes.Last_Index).all.Id = XML_Tag then This.Current_Nodes.Constant_Reference (This.Current_Nodes.Last_Index).all.Inner.My_Tag.My_Child_Nodes.Append (Current_Node); This.Current_Nodes.Append (Current_Node); else Call_Result.Initialize (1695756105, 1714042669); end if; end; else Call_Result.Initialize (-0416079960, -1464855808); end if; when End_State => Call_Result.Initialize (0561631589, 0761077416); end case; end Start_Tag; procedure End_Tag (This : in out SAX_Parser_T; Tag_Name : Standard.String; Call_Result : in out Aida.Subprogram_Call_Result.T) is begin case This.State is when Expecting_Default => if not This.Current_Nodes.Is_Empty and then (This.Current_Nodes.Constant_Reference (This.Current_Nodes.Last_Index).all.Id = XML_Tag) then if This.Current_Nodes.Constant_Reference (This.Current_Nodes.Last_Index).all.Tag.Name = Tag_Name then This.Current_Nodes.Delete_Last; if This.Current_Nodes.Is_Empty then This.State := End_State; end if; else Call_Result.Initialize (-0316487383, -2063296151); end if; else Call_Result.Initialize (-1355522791, 1675536860); end if; when Expecting_Object_Start | End_State => Call_Result.Initialize (-0728861922, -0299445966); end case; end End_Tag; procedure Text (This : in out SAX_Parser_T; Value : Standard.String; Call_Result : in out Aida.Subprogram_Call_Result.T) is begin case This.State is when Expecting_Default => if Value'Length = 0 or (Value'Length > 0 and then (for all I in Value'Range => Value (I) = ' ' or Value (I) = Standard.Character'Val (10) or Value (I) = Standard.Character'Val (13))) then null; elsif not This.Current_Nodes.Is_Empty then declare Current_Node : not null Node_Ptr := new (This.Subpool) Node_T; begin Current_Node.Inner := (My_Id => XML_Text, My_Text => new (This.Subpool) Standard.String'(Value)); if This.Current_Nodes.Constant_Reference (This.Current_Nodes.Last_Index).all.Id = XML_Tag then This.Current_Nodes.Constant_Reference (This.Current_Nodes.Last_Index).all.Inner.My_Tag.My_Child_Nodes.Append (Current_Node); else Call_Result.Initialize (-0944309962, -0212130363); end if; end; else Call_Result.Initialize (0536156601, 0921613311); end if; when Expecting_Object_Start | End_State => Call_Result.Initialize (0240750889, 1723362921); end case; end Text; procedure Attribute (This : in out SAX_Parser_T; Attribute_Name : Standard.String; Attribute_Value : Standard.String; Call_Result : in out Aida.Subprogram_Call_Result.T) is begin case This.State is when Expecting_Default => if not This.Current_Nodes.Is_Empty then if Attribute_Name'Length > 0 and Attribute_Value'Length > 0 then declare Attribute : not null Attribute_Ptr := new (This.Subpool) Attribute_T; begin Attribute.My_Name := new (This.Subpool) Standard.String'(Attribute_Name); Attribute.My_Value := new (This.Subpool) Standard.String'(Attribute_Value); if This.Current_Nodes.Constant_Reference (This.Current_Nodes.Last_Index).all.Id = XML_Tag then This.Current_Nodes.Constant_Reference (This.Current_Nodes.Last_Index).all.Inner.My_Tag.My_Attributes.Append (Attribute); else Call_Result.Initialize (0612916249, -0250963769); end if; end; else Call_Result.Initialize (-1091502024, -1483543078); end if; else Call_Result.Initialize (-0372407662, -1139199208); end if; when Expecting_Object_Start | End_State => Call_Result.Initialize (1103012185, 0319457400); end case; end Attribute; procedure Comment (This : in out SAX_Parser_T; Value : Standard.String; Call_Result : in out Aida.Subprogram_Call_Result.T) is begin case This.State is when Expecting_Default => if not This.Current_Nodes.Is_Empty then if Value'Length > 0 then declare Node : Node_Ptr := new (This.Subpool) Node_T; begin Node.Inner := (My_Id => XML_Comment, My_Text => new (This.Subpool) Standard.String'(Value)); if This.Current_Nodes.Constant_Reference (This.Current_Nodes.Last_Index).all.Id = XML_Tag then This.Current_Nodes.Constant_Reference (This.Current_Nodes.Last_Index).all.Inner.My_Tag.My_Child_Nodes.Append (Node); else Call_Result.Initialize (2066772500, 1193932906); end if; end; else Call_Result.Initialize (1366102371, 1421674126); end if; else Call_Result.Initialize (0845969060, 0639006566); end if; when Expecting_Object_Start | End_State => Call_Result.Initialize (-1373186804, -0874315849); end case; end Comment; procedure CDATA (This : in out SAX_Parser_T; Value : Standard.String; Call_Result : in out Aida.Subprogram_Call_Result.T) is begin case This.State is when Expecting_Default => if not This.Current_Nodes.Is_Empty then if Value'Length > 0 then declare Node : Node_Ptr := new (This.Subpool) Node_T; begin Node.Inner := (My_Id => XML_CDATA, My_Text => new (This.Subpool) Standard.String'(Value)); if This.Current_Nodes.Constant_Reference (This.Current_Nodes.Last_Index).all.Id = XML_Tag then This.Current_Nodes.Constant_Reference (This.Current_Nodes.Last_Index).all.Inner.My_Tag.My_Child_Nodes.Append (Node); else Call_Result.Initialize (-2021174626, -1403249390); end if; end; else Call_Result.Initialize (1915730777, 1973598725); end if; else Call_Result.Initialize (-0076965217, 0193355440); end if; when Expecting_Object_Start | End_State => Call_Result.Initialize (0698504230, -0963685542); end case; end CDATA; procedure Parse (This : in out DOM_Parser_T; Subpool : in out Dynamic_Pools.Subpool_Handle; XML_Message : Standard.String; Call_Result : in out Aida.Subprogram_Call_Result.T; Root_Node : out Node_Ptr) is SAX_Parser : SAX_Parser_T; begin SAX_Parser.Subpool := Subpool; SAX_Parser.Parse (XML_Message, Call_Result); Root_Node := SAX_Parser.Root_Node; end Parse; end Aida.Deepend_XML_DOM_Parser;
Fabien-Chouteau/samd51-hal
Ada
9,132
ads
------------------------------------------------------------------------------ -- -- -- Copyright (C) 2019, 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 HAL; with System; package SAM.DMAC is type Descriptor_Section; type Descriptor_Section_Access is access all Descriptor_Section; -- See definition below procedure Enable (Descriptors : not null Descriptor_Section_Access; Write_Back : not null Descriptor_Section_Access); procedure Disable; type Channel_Id is range 0 .. 31; type Priority_Level is range 0 .. 3; -- Priority level used for the DMA channel, where a high level has priority -- over a low level. type Trigger_Source is new HAL.UInt7; -- See child package SAM.DMAC.Sources type Trigger_Action is (Block, Burst, Transaction); -- Trigger action used for a transfer type FIFO_Threshold_Kind is (BEAT_1, BEAT_2, BEAT_4, BEAT_8); -- Threshold from which the DMA starts to write to the destination. These -- bits have no effect in the case of single beat transfers. type Burst_Length is range 1 .. 16; -- Channel actions -- procedure Configure (Id : Channel_Id; Trig_Src : Trigger_Source; Trig_Action : Trigger_Action; Priority : Priority_Level; Burst_Len : Burst_Length; Threshold : FIFO_Threshold_Kind; Run_In_Standby : Boolean); procedure Enable (Id : Channel_Id); procedure Suspend (Id : Channel_Id); procedure Resume (Id : Channel_Id); procedure Software_Trigger (Id : Channel_Id); -- Channel Status -- function Pending (Id : Channel_Id) return Boolean; function Busy (Id : Channel_Id) return Boolean; function Fetch_Error (Id : Channel_Id) return Boolean; function CRC_Error (Id : Channel_Id) return Boolean; -- Channel Interrupts -- type Interrupt_Kind is (Suspend, Transfer_Complete, Transfer_Error); procedure Enable (Id : Channel_Id; Int : Interrupt_Kind); procedure Disable (Id : Channel_Id; Int : Interrupt_Kind); procedure Clear (Id : Channel_Id; Int : Interrupt_Kind); function Set (Id : Channel_Id; Int : Interrupt_Kind) return Boolean; -- Transfer Descriptor -- type Transfer_Descriptor is private; -- Transfer_Descriptor is declared private because setting its values is not -- trivial (address increments in particular). Use Configure_Descriptor () -- and Set_Data_Transfer () to write a Transfer_Descriptor; type Transfer_Descriptor_Access is access all Transfer_Descriptor; type Event_Output_Kind is (Disable, -- Event generation disabled Block, -- Event strobe when block transfer complete Beat) -- Event strobe when beat transfer complete with Size => 2; type Block_Action_Kind is (No_Action, -- Channel will be disabled if it is the last block transfer in the -- transaction. Interrupt, -- Channel will be disabled if it is the last block transfer in the -- transaction and block interrupt. Suspend, -- Channel suspend operation is completed Both -- Both channel suspend operation and block interrupt ) with Size => 2; type Beat_Size_Kind is (B_8bit, B_16bit, B_32bit) with Size => 2; type Step_Selection_Kind is (Destination, Source) with Size => 1; type Step_Size_Kind is (X1, X2, X4, X8, X16, X32, X64, X128) with Size => 3; type Descriptor_Section is array (Channel_Id) of Transfer_Descriptor; procedure Configure_Descriptor (Desc : in out Transfer_Descriptor; Valid : Boolean; Event_Output : Event_Output_Kind; Block_Action : Block_Action_Kind; Beat_Size : Beat_Size_Kind; Src_Addr_Inc : Boolean; Dst_Addr_Inc : Boolean; Step_Selection : Step_Selection_Kind; Step_Size : Step_Size_Kind; Next_Descriptor : Transfer_Descriptor_Access := null); procedure Set_Data_Transfer (Desc : in out Transfer_Descriptor; Block_Transfer_Count : HAL.UInt16; Src_Addr : System.Address; Dst_Addr : System.Address); private pragma Inline (Configure_Descriptor); pragma Inline (Set_Data_Transfer); pragma Inline (Enable); for Trigger_Action use (Block => 0, Burst => 2, Transaction => 3); for FIFO_Threshold_Kind use (BEAT_1 => 0, BEAT_2 => 2, BEAT_4 => 3, BEAT_8 => 4); for Event_Output_Kind use (Disable => 0, Block => 1, Beat => 3); for Block_Action_Kind use (No_Action => 0, Interrupt => 1, Suspend => 2, Both => 3); for Beat_Size_Kind use (B_8bit => 0, B_16bit => 1, B_32bit => 2); for Step_Selection_Kind use (Destination => 0, Source => 1); for Step_Size_Kind use (X1 => 0, X2 => 1, X4 => 2, X8 => 3, X16 => 4, X32 => 5, X64 => 6, X128 => 7); type Transfer_Descriptor is record Valid : Boolean := False; Event_Output : Event_Output_Kind; Block_Action : Block_Action_Kind; Set_To_Zero : HAL.UInt3 := 0; Beat_Size : Beat_Size_Kind; Src_Addr_Inc : Boolean; Dst_Addr_Inc : Boolean; Step_Selection : Step_Selection_Kind; Step_Size : Step_Size_Kind; Block_Transfer_Count : HAL.UInt16; Src_Addr : System.Address; Dst_Addr : System.Address; Next_Descriptor : Transfer_Descriptor_Access := null; end record with Volatile, Size => 128, Alignment => 8; for Transfer_Descriptor use record Valid at 16#0# range 0 .. 0; Event_Output at 16#0# range 1 .. 2; Block_Action at 16#0# range 3 .. 4; Set_To_Zero at 16#0# range 5 .. 7; Beat_Size at 16#0# range 8 .. 9; Src_Addr_Inc at 16#0# range 10 .. 10; Dst_Addr_Inc at 16#0# range 11 .. 11; Step_Selection at 16#0# range 12 .. 12; Step_Size at 16#0# range 13 .. 15; Block_Transfer_Count at 16#2# range 0 .. 15; Src_Addr at 16#4# range 0 .. 31; Dst_Addr at 16#8# range 0 .. 31; Next_Descriptor at 16#C# range 0 .. 31; end record; for Descriptor_Section'Alignment use 128; for Descriptor_Section'Size use 32 * 128; end SAM.DMAC;
reznikmm/matreshka
Ada
4,182
ads
------------------------------------------------------------------------------ -- -- -- Matreshka Project -- -- -- -- Web Framework -- -- -- -- Runtime Library Component -- -- -- ------------------------------------------------------------------------------ -- -- -- Copyright © 2012, Vadim Godunko <[email protected]> -- -- All rights reserved. -- -- -- -- Redistribution and use in source and binary forms, with or without -- -- modification, are permitted provided that the following conditions -- -- are met: -- -- -- -- * Redistributions of source code must retain the above copyright -- -- notice, this list of conditions and the following disclaimer. -- -- -- -- * Redistributions in binary form must reproduce the above copyright -- -- notice, this list of conditions and the following disclaimer in the -- -- documentation and/or other materials provided with the distribution. -- -- -- -- * Neither the name of the Vadim Godunko, IE nor the names of its -- -- contributors may be used to endorse or promote products derived from -- -- this software without specific prior written permission. -- -- -- -- THIS SOFTWARE IS PROVIDED BY THE COPYRIGHT HOLDERS AND CONTRIBUTORS -- -- "AS IS" AND ANY EXPRESS OR IMPLIED WARRANTIES, INCLUDING, BUT NOT -- -- LIMITED TO, THE IMPLIED WARRANTIES OF MERCHANTABILITY AND FITNESS FOR -- -- A PARTICULAR PURPOSE ARE DISCLAIMED. IN NO EVENT SHALL THE COPYRIGHT -- -- HOLDER OR CONTRIBUTORS BE LIABLE FOR ANY DIRECT, INDIRECT, INCIDENTAL, -- -- SPECIAL, EXEMPLARY, OR CONSEQUENTIAL DAMAGES (INCLUDING, BUT NOT LIMITED -- -- TO, PROCUREMENT OF SUBSTITUTE GOODS OR SERVICES; LOSS OF USE, DATA, OR -- -- PROFITS; OR BUSINESS INTERRUPTION) HOWEVER CAUSED AND ON ANY THEORY OF -- -- LIABILITY, WHETHER IN CONTRACT, STRICT LIABILITY, OR TORT (INCLUDING -- -- NEGLIGENCE OR OTHERWISE) ARISING IN ANY WAY OUT OF THE USE OF THIS -- -- SOFTWARE, EVEN IF ADVISED OF THE POSSIBILITY OF SUCH DAMAGE. -- -- -- ------------------------------------------------------------------------------ -- $Revision$ $Date$ ------------------------------------------------------------------------------ with Ada.Containers.Vectors; with Ada.Tags; with Web_Services.SOAP.Handlers; package Web_Services.SOAP.Handler_Registry is procedure Register (Tag : Ada.Tags.Tag; Handler : not null Web_Services.SOAP.Handlers.SOAP_Message_Handler); -- Register handler for the given tag. procedure Register (Handler : not null Web_Services.SOAP.Handlers.SOAP_RPC_Handler); -- Register RPC-style handler. function Resolve (Tag : Ada.Tags.Tag) return Web_Services.SOAP.Handlers.SOAP_Message_Handler; -- Returns handler for the given tag. package Handler_Vectors is new Ada.Containers.Vectors (Positive, Web_Services.SOAP.Handlers.SOAP_RPC_Handler, Web_Services.SOAP.Handlers."="); RPC_Registry : Handler_Vectors.Vector; end Web_Services.SOAP.Handler_Registry;
reznikmm/gela
Ada
9,370
ads
------------------------------------------------------------------------------- ------------------------------------------------------------------------------- -- 6 package Asis.Implementation ------------------------------------------------------------------------------- ------------------------------------------------------------------------------- with Asis.Errors; package Asis.Implementation is pragma Preelaborate; ------------------------------------------------------------------------------- ------------------------------------------------------------------------------- -- Asis.Implementation provides queries to initialize, finalize, and query the -- error status of the ASIS Implementation. ------------------------------------------------------------------------------- ------------------------------------------------------------------------------- ------------------------------------------------------------------------------- -- 6.1 function ASIS_Version ------------------------------------------------------------------------------- function ASIS_Version return Wide_String; ------------------------------------------------------------------------------- -- 6.2 function ASIS_Implementor ------------------------------------------------------------------------------- function ASIS_Implementor return Wide_String; ------------------------------------------------------------------------------- -- 6.3 function ASIS_Implementor_Version ------------------------------------------------------------------------------- function ASIS_Implementor_Version return Wide_String; ------------------------------------------------------------------------------- -- 6.4 function ASIS_Implementor_Information ------------------------------------------------------------------------------- function ASIS_Implementor_Information return Wide_String; ------------------------------------------------------------------------------- -- Returns values which identify: -- -- ASIS_Version the version of the ASIS interface, e.g., "2.1" -- ASIS_Implementor the name of the implementor, e.g., "Ada Inc." -- ASIS_Implementor_Version the implementation's version, e.g., "5.2a" -- ASIS_Implementor_Information implementation information, e.g., "Copyright." -- ------------------------------------------------------------------------------- -- 6.5 function Is_Initialized ------------------------------------------------------------------------------- function Is_Initialized return Boolean; ------------------------------------------------------------------------------- -- Returns True if ASIS is currently initialized. -- ------------------------------------------------------------------------------- -- 6.6 procedure Initialize ------------------------------------------------------------------------------- procedure Initialize (Parameters : in Wide_String := ""); ------------------------------------------------------------------------------- -- Parameters - Specifies implementation specific parameters. -- -- Performs any necessary initialization activities. This shall be invoked -- at least once before any other ASIS services are used. Parameter values -- are implementation dependent. The call is ignored if ASIS is already -- initialized. All ASIS queries and services are ready for use once this -- call completes. -- -- Raises ASIS_Failed if ASIS failed to initialize or if the Parameters -- argument is invalid. Status is Environment_Error or Parameter_Error. -- -- |AN Application Note: -- |AN -- |AN The ASIS implementation may be Initialized and Finalized any number of -- |AN times during the operation of an ASIS program. However, all existing -- |AN Context, Compilation_Unit and Element values become invalid when -- |AN ASIS Is_Finalized. Subsequent calls to ASIS queries or services using -- |AN such invalid Compilation_Unit or Element values will cause -- |AN ASIS_Inappropriate_Context to be raised. -- ------------------------------------------------------------------------------- -- 6.7 function Is_Finalized ------------------------------------------------------------------------------- function Is_Finalized return Boolean; ------------------------------------------------------------------------------- -- Returns True if ASIS is currently finalized or if ASIS has never been -- initialized. -- ------------------------------------------------------------------------------- -- 6.8 procedure Finalize ------------------------------------------------------------------------------- procedure Finalize (Parameters : in Wide_String := ""); ------------------------------------------------------------------------------- -- Parameters - Specifies any implementation required parameter values. -- -- Performs any necessary ASIS termination activities. This should be invoked -- once following the last use of other ASIS queries. Parameter values are -- implementation dependent. The call is ignored if ASIS is already -- finalized. Subsequent calls to ASIS Environment, Compilation_Unit, and -- Element queries, are erroneous while the environment Is_Finalized. -- -- Raises ASIS_Failed if the ASIS implementation failed to finalize. Status -- is likely to be Internal_Error and will not be Not_An_Error. -- ------------------------------------------------------------------------------- -- Whenever an error condition is detected, and any ASIS exception is raised, -- an Asis.Errors.Error_Kinds value and a Diagnosis string is stored. These -- values can be retrieved by the Status and Diagnosis functions. The -- Diagnosis function will retrieve the diagnostic message describing -- the error. -- -- Error information always refers to the most recently recorded error. -- -- Note that Diagnosis values are implementation dependent and may vary -- greatly among ASIS implementations. -- ------------------------------------------------------------------------------- -- 6.9 function Status ------------------------------------------------------------------------------- function Status return Asis.Errors.Error_Kinds; ------------------------------------------------------------------------------- -- Returns the Error_Kinds value for the most recent error. -- ------------------------------------------------------------------------------- -- 6.10 function Diagnosis ------------------------------------------------------------------------------- function Diagnosis return Wide_String; ------------------------------------------------------------------------------- -- Returns a string value describing the most recent error. -- -- Will typically return a null string if Status = Not_An_Error. -- ------------------------------------------------------------------------------- -- 6.11 procedure Set_Status ------------------------------------------------------------------------------- procedure Set_Status (Status : in Asis.Errors.Error_Kinds := Asis.Errors.Not_An_Error; Diagnosis : in Wide_String := ""); ------------------------------------------------------------------------------- -- Status - Specifies the new status to be recorded -- Diagnosis - Specifies the new diagnosis to be recorded -- -- Sets (clears, if the defaults are used) the Status and Diagnosis -- information. Future calls to Status will return this Status (Not_An_Error) -- and this Diagnosis (a null string). -- -- Raises ASIS_Failed, with a Status of Internal_Error and a Diagnosis of -- a null string, if the Status parameter is Not_An_Error and the Diagnosis -- parameter is not a null string. -- ------------------------------------------------------------------------------- end Asis.Implementation; ------------------------------------------------------------------------------ -- Copyright (c) 2006, Maxim Reznik -- All rights reserved. -- -- Redistribution and use in source and binary forms, with or without -- modification, are permitted provided that the following conditions are met: -- -- * Redistributions of source code must retain the above copyright notice, -- * this list of conditions and the following disclaimer. -- * Redistributions in binary form must reproduce the above copyright -- * notice, this list of conditions and the following disclaimer in the -- * documentation and/or other materials provided with the distribution. -- -- 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. ------------------------------------------------------------------------------
reznikmm/matreshka
Ada
6,719
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_Svg.Stop_Elements is ------------ -- Create -- ------------ overriding function Create (Parameters : not null access Matreshka.DOM_Elements.Element_L2_Parameters) return Svg_Stop_Element_Node is begin return Self : Svg_Stop_Element_Node do Matreshka.ODF_Svg.Constructors.Initialize (Self'Unchecked_Access, Parameters.Document, Matreshka.ODF_String_Constants.Svg_Prefix); end return; end Create; ---------------- -- Enter_Node -- ---------------- overriding procedure Enter_Node (Self : not null access Svg_Stop_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_Svg_Stop (ODF.DOM.Svg_Stop_Elements.ODF_Svg_Stop_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 Svg_Stop_Element_Node) return League.Strings.Universal_String is pragma Unreferenced (Self); begin return Matreshka.ODF_String_Constants.Stop_Element; end Get_Local_Name; ---------------- -- Leave_Node -- ---------------- overriding procedure Leave_Node (Self : not null access Svg_Stop_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_Svg_Stop (ODF.DOM.Svg_Stop_Elements.ODF_Svg_Stop_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 Svg_Stop_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_Svg_Stop (Visitor, ODF.DOM.Svg_Stop_Elements.ODF_Svg_Stop_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.Svg_URI, Matreshka.ODF_String_Constants.Stop_Element, Svg_Stop_Element_Node'Tag); end Matreshka.ODF_Svg.Stop_Elements;
reznikmm/matreshka
Ada
3,618
ads
------------------------------------------------------------------------------ -- -- -- Matreshka Project -- -- -- -- XML Processor -- -- -- -- 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.XML_Schema.AST; package XML.Schema.Objects.Terms.Model_Groups.Internals is pragma Preelaborate; function Create (Node : Matreshka.XML_Schema.AST.Model_Group_Access) return XS_Model_Group; end XML.Schema.Objects.Terms.Model_Groups.Internals;
gitter-badger/spat
Ada
2,393
ads
------------------------------------------------------------------------------ -- Copyright (C) 2020 by Heisenbug Ltd. ([email protected]) -- -- This work is free. You can redistribute it and/or modify it under the -- terms of the Do What The Fuck You Want To Public License, Version 2, -- as published by Sam Hocevar. See the LICENSE file for more details. ------------------------------------------------------------------------------ pragma License (Unrestricted); ------------------------------------------------------------------------------ -- -- SPARK Proof Analysis Tool -- -- S.P.A.T. - Names of recognized fields in JSON data. -- ------------------------------------------------------------------------------ package SPAT.Field_Names is Assumptions : constant UTF8_String := "assumptions"; Check_Tree : constant UTF8_String := "check_tree"; Column : constant UTF8_String := "col"; Entity : constant UTF8_String := "entity"; File : constant UTF8_String := "file"; Flow : constant UTF8_String := "flow"; Flow_Analysis : constant UTF8_String := "flow analysis"; Line : constant UTF8_String := "line"; Name : constant UTF8_String := "name"; Proof : constant UTF8_String := "proof"; Proof_Attempts : constant UTF8_String := "proof_attempts"; Result : constant UTF8_String := "result"; Rule : constant UTF8_String := "rule"; Severity : constant UTF8_String := "severity"; Sloc : constant UTF8_String := "sloc"; Spark : constant UTF8_String := "spark"; Steps : constant UTF8_String := "steps"; Suppressed : constant UTF8_String := "suppressed"; Time : constant UTF8_String := "time"; Timings : constant UTF8_String := "timings"; Transformations : constant UTF8_String := "transformations"; Trivial_True : constant UTF8_String := "trivial_true"; -- GNAT_CE_2019 Translation_Of_Compilation_Unit : constant UTF8_String := "translation of compilation unit"; -- GNAT_CE_2020 GNAT_Why3_Prefixed : constant UTF8_String := "gnatwhy3."; -- Not really a single field name, but a collection of sub-fields containing -- timing information. Session_Map : constant UTF8_String := "session_map"; end SPAT.Field_Names;
google-code/ada-util
Ada
14,456
adb
----------------------------------------------------------------------- -- util-encodes-tests - Test for encoding -- Copyright (C) 2009, 2010, 2011, 2012 Stephane Carrez -- Written by Stephane Carrez ([email protected]) -- -- Licensed under the Apache License, Version 2.0 (the "License"); -- you may not use this file except in compliance with the License. -- You may obtain a copy of the License at -- -- http://www.apache.org/licenses/LICENSE-2.0 -- -- Unless required by applicable law or agreed to in writing, software -- distributed under the License is distributed on an "AS IS" BASIS, -- WITHOUT WARRANTIES OR CONDITIONS OF ANY KIND, either express or implied. -- See the License for the specific language governing permissions and -- limitations under the License. ----------------------------------------------------------------------- with Util.Test_Caller; with Util.Measures; with Util.Strings.Transforms; with Ada.Text_IO; with Util.Encoders.SHA1; with Util.Encoders.HMAC.SHA1; package body Util.Encoders.Tests is use Util.Tests; -- use Util.Log; -- -- Log : constant Loggers.Logger := Loggers.Create ("Util.Encoders.Tests"); procedure Check_HMAC (T : in out Test'Class; Key : in String; Value : in String; Expect : in String); package Caller is new Util.Test_Caller (Test, "Encoders"); procedure Add_Tests (Suite : in Util.Tests.Access_Test_Suite) is begin Caller.Add_Test (Suite, "Test Util.Encoders.Base16.Encode", Test_Hex'Access); Caller.Add_Test (Suite, "Test Util.Encoders.Base16.Decode", Test_Hex'Access); Caller.Add_Test (Suite, "Test Util.Encoders.Base64.Encode", Test_Base64_Encode'Access); Caller.Add_Test (Suite, "Test Util.Encoders.Base64.Decode", Test_Base64_Decode'Access); Caller.Add_Test (Suite, "Test Util.Encoders.Base64.Encode (URL)", Test_Base64_URL_Encode'Access); Caller.Add_Test (Suite, "Test Util.Encoders.Base64.Decode (URL)", Test_Base64_URL_Decode'Access); Caller.Add_Test (Suite, "Test Util.Encoders.Base64.Benchmark", Test_Base64_Benchmark'Access); Caller.Add_Test (Suite, "Test Util.Encoders.SHA1.Encode", Test_SHA1_Encode'Access); Caller.Add_Test (Suite, "Test Util.Encoders.SHA1.Benchmark", Test_SHA1_Benchmark'Access); Caller.Add_Test (Suite, "Test Util.Encoders.HMAC.SHA1.Sign_SHA1 (RFC2202 test1)", Test_HMAC_SHA1_RFC2202_T1'Access); Caller.Add_Test (Suite, "Test Util.Encoders.HMAC.SHA1.Sign_SHA1 (RFC2202 test2)", Test_HMAC_SHA1_RFC2202_T2'Access); Caller.Add_Test (Suite, "Test Util.Encoders.HMAC.SHA1.Sign_SHA1 (RFC2202 test3)", Test_HMAC_SHA1_RFC2202_T3'Access); Caller.Add_Test (Suite, "Test Util.Encoders.HMAC.SHA1.Sign_SHA1 (RFC2202 test4)", Test_HMAC_SHA1_RFC2202_T4'Access); Caller.Add_Test (Suite, "Test Util.Encoders.HMAC.SHA1.Sign_SHA1 (RFC2202 test5)", Test_HMAC_SHA1_RFC2202_T5'Access); Caller.Add_Test (Suite, "Test Util.Encoders.HMAC.SHA1.Sign_SHA1 (RFC2202 test6)", Test_HMAC_SHA1_RFC2202_T6'Access); Caller.Add_Test (Suite, "Test Util.Encoders.HMAC.SHA1.Sign_SHA1 (RFC2202 test7)", Test_HMAC_SHA1_RFC2202_T7'Access); Caller.Add_Test (Suite, "Test Util.Encoders.Encode_LEB128", Test_LEB128'Access); end Add_Tests; procedure Test_Base64_Encode (T : in out Test) is C : constant Util.Encoders.Encoder := Create ("base64"); begin Assert_Equals (T, "YQ==", Util.Encoders.Encode (C, "a")); Assert_Equals (T, "fA==", Util.Encoders.Encode (C, "|")); Assert_Equals (T, "fHw=", Util.Encoders.Encode (C, "||")); Assert_Equals (T, "fH5+", Util.Encoders.Encode (C, "|~~")); end Test_Base64_Encode; procedure Test_Base64_Decode (T : in out Test) is C : Util.Encoders.Encoder := Create ("base64"); begin Assert_Equals (T, "a", Util.Encoders.Decode (C, "YQ==")); Assert_Equals (T, "|", Util.Encoders.Decode (C, "fA==")); Assert_Equals (T, "||", Util.Encoders.Decode (C, "fHw=")); Assert_Equals (T, "|~~", Util.Encoders.Decode (C, "fH5+")); Test_Encoder (T, C); end Test_Base64_Decode; procedure Test_Base64_URL_Encode (T : in out Test) is C : constant Util.Encoders.Encoder := Create ("base64url"); begin Assert_Equals (T, "YQ==", Util.Encoders.Encode (C, "a")); Assert_Equals (T, "fA==", Util.Encoders.Encode (C, "|")); Assert_Equals (T, "fHw=", Util.Encoders.Encode (C, "||")); Assert_Equals (T, "fH5-", Util.Encoders.Encode (C, "|~~")); Assert_Equals (T, "fH5_", Util.Encoders.Encode (C, "|~" & ASCII.DEL)); end Test_Base64_URL_Encode; procedure Test_Base64_URL_Decode (T : in out Test) is C : Util.Encoders.Encoder := Create ("base64url"); begin Assert_Equals (T, "a", Util.Encoders.Decode (C, "YQ==")); Assert_Equals (T, "|", Util.Encoders.Decode (C, "fA==")); Assert_Equals (T, "||", Util.Encoders.Decode (C, "fHw=")); Assert_Equals (T, "|~~", Util.Encoders.Decode (C, "fH5-")); Assert_Equals (T, "|~" & ASCII.DEL, Util.Encoders.Decode (C, "fH5_")); Test_Encoder (T, C); end Test_Base64_URL_Decode; procedure Test_Encoder (T : in out Test; C : in out Util.Encoders.Encoder) is begin for I in 1 .. 334 loop declare Pattern : String (1 .. I); begin for J in Pattern'Range loop Pattern (J) := Character'Val (((J + I) mod 63) + 32); end loop; declare E : constant String := Util.Encoders.Encode (C, Pattern); D : constant String := Util.Encoders.Decode (C, E); begin Assert_Equals (T, Pattern, D, "Encoding failed for length " & Integer'Image (I) & " code: " & E); end; exception when others => Ada.Text_IO.Put_Line ("Error at index " & Integer'Image (I)); raise; end; end loop; end Test_Encoder; procedure Test_Hex (T : in out Test) is C : Util.Encoders.Encoder := Create ("hex"); begin Assert_Equals (T, "41424344", Util.Encoders.Encode (C, "ABCD")); Assert_Equals (T, "ABCD", Util.Encoders.Decode (C, "41424344")); Test_Encoder (T, C); end Test_Hex; procedure Test_Base64_Benchmark (T : in out Test) is pragma Unreferenced (T); C : constant Util.Encoders.Encoder := Create ("base64"); S : constant String (1 .. 1_024) := (others => 'a'); begin declare T : Util.Measures.Stamp; R : constant String := Util.Encoders.Encode (C, S); pragma Unreferenced (R); begin Util.Measures.Report (T, "Base64 encode 1024 bytes"); end; end Test_Base64_Benchmark; procedure Test_SHA1_Encode (T : in out Test) is procedure Check_Hash (Value : in String; Expect : in String); C : Util.Encoders.SHA1.Context; Hash : Util.Encoders.SHA1.Digest; procedure Check_Hash (Value : in String; Expect : in String) is J, N : Natural; Ctx : Util.Encoders.SHA1.Context; begin for I in 1 .. Value'Length loop J := Value'First; while J <= Value'Last loop if J + I <= Value'Last then N := J + I; else N := Value'Last; end if; Util.Encoders.SHA1.Update (Ctx, Value (J .. N)); J := N + 1; end loop; Util.Encoders.SHA1.Finish (Ctx, Hash); Assert_Equals (T, Expect, Hash, "Invalid hash for: " & Value); end loop; end Check_Hash; begin Util.Encoders.SHA1.Update (C, "a"); Util.Encoders.SHA1.Finish (C, Hash); Assert_Equals (T, "86F7E437FAA5A7FCE15D1DDCB9EAEAEA377667B8", Hash, "Invalid hash for 'a'"); Check_Hash ("ut", "E746699D3947443D84DAD1E0C58BF7AD34712438"); Check_Hash ("Uti", "2C669751BDC4929377245F5EEBEAED1CE4DA8A45"); Check_Hash ("Util", "4C31156EFED35EE7814650F8971C3698059440E3"); Check_Hash ("Util.Encoders", "7DB6007AD8BAEA7C167FF2AE06C9F50A4645F971"); Check_Hash ("e746699d3947443d84dad1e0c58bf7ad347124382C669751BDC492937" & "7245F5EEBEAED1CE4DA8A45", "875C9C0DE4CE91ED8F432DD02B5BB40CD35DAACD"); end Test_SHA1_Encode; -- ------------------------------ -- Benchmark test for SHA1 -- ------------------------------ procedure Test_SHA1_Benchmark (T : in out Test) is pragma Unreferenced (T); Hash : Util.Encoders.SHA1.Digest; Sizes : constant array (1 .. 6) of Positive := (1, 10, 100, 1000, 10000, 100000); begin for I in Sizes'Range loop declare Size : constant Positive := Sizes (I); S : constant String (1 .. Size) := (others => '0'); T1 : Util.Measures.Stamp; C : Util.Encoders.SHA1.Context; begin Util.Encoders.SHA1.Update (C, S); Util.Encoders.SHA1.Finish (C, Hash); Util.Measures.Report (T1, "Encode SHA1" & Integer'Image (Size) & " bytes"); end; end loop; end Test_SHA1_Benchmark; procedure Check_HMAC (T : in out Test'Class; Key : in String; Value : in String; Expect : in String) is H : constant String := Util.Encoders.HMAC.SHA1.Sign (Key, Value); begin Assert_Equals (T, Expect, Util.Strings.Transforms.To_Lower_Case (H), "Invalid HMAC-SHA1"); end Check_HMAC; -- ------------------------------ -- Test HMAC-SHA1 -- ------------------------------ procedure Test_HMAC_SHA1_RFC2202_T1 (T : in out Test) is Key : constant String (1 .. 20) := (others => Character'Val (16#0b#)); begin Check_HMAC (T, Key, "Hi There", "b617318655057264e28bc0b6fb378c8ef146be00"); end Test_HMAC_SHA1_RFC2202_T1; procedure Test_HMAC_SHA1_RFC2202_T2 (T : in out Test) is begin Check_HMAC (T, "Jefe", "what do ya want for nothing?", "effcdf6ae5eb2fa2d27416d5f184df9c259a7c79"); end Test_HMAC_SHA1_RFC2202_T2; procedure Test_HMAC_SHA1_RFC2202_T3 (T : in out Test) is Key : constant String (1 .. 20) := (others => Character'Val (16#aa#)); Data : constant String (1 .. 50) := (others => Character'Val (16#dd#)); begin Check_HMAC (T, Key, Data, "125d7342b9ac11cd91a39af48aa17b4f63f175d3"); end Test_HMAC_SHA1_RFC2202_T3; procedure Test_HMAC_SHA1_RFC2202_T4 (T : in out Test) is C : constant Util.Encoders.Encoder := Create ("hex"); Key : constant String := Util.Encoders.Decode (C, "0102030405060708090a0b0c0d0e0f" & "10111213141516171819"); Data : constant String (1 .. 50) := (others => Character'Val (16#cd#)); begin Check_HMAC (T, Key, Data, "4c9007f4026250c6bc8414f9bf50c86c2d7235da"); end Test_HMAC_SHA1_RFC2202_T4; procedure Test_HMAC_SHA1_RFC2202_T5 (T : in out Test) is Key : constant String (1 .. 20) := (others => Character'Val (16#0c#)); begin -- RFC2202 test case 5 but without truncation... Check_HMAC (T, Key, "Test With Truncation", "4c1a03424b55e07fe7f27be1d58bb9324a9a5a04"); end Test_HMAC_SHA1_RFC2202_T5; procedure Test_HMAC_SHA1_RFC2202_T6 (T : in out Test) is Key : constant String (1 .. 80) := (others => Character'Val (16#aa#)); begin Check_HMAC (T, Key, "Test Using Larger Than Block-Size Key - Hash Key First", "aa4ae5e15272d00e95705637ce8a3b55ed402112"); end Test_HMAC_SHA1_RFC2202_T6; procedure Test_HMAC_SHA1_RFC2202_T7 (T : in out Test) is Key : constant String (1 .. 80) := (others => Character'Val (16#Aa#)); begin Check_HMAC (T, Key, "Test Using Larger Than Block-Size Key and Larger " & "Than One Block-Size Data", "e8e99d0f45237d786d6bbaa7965c7808bbff1a91"); end Test_HMAC_SHA1_RFC2202_T7; -- ------------------------------ -- Test encoding leb128. -- ------------------------------ procedure Test_LEB128 (T : in out Test) is use type Interfaces.Unsigned_64; Data : Ada.Streams.Stream_Element_Array (1 .. 100); Last : Ada.Streams.Stream_Element_Offset; Val : Interfaces.Unsigned_64; Res : Interfaces.Unsigned_64; begin Encode_LEB128 (Into => Data, Pos => Data'First, Val => 1, Last => Last); Util.Tests.Assert_Equals (T, 1, Integer (Last), "Invalid last position"); Util.Tests.Assert_Equals (T, 1, Integer (Data (1)), "Invalid value"); Encode_LEB128 (Into => Data, Pos => Data'First, Val => 16#80#, Last => Last); Util.Tests.Assert_Equals (T, 2, Integer (Last), "Invalid last position"); Util.Tests.Assert_Equals (T, 16#80#, Integer (Data (1)), "Invalid value"); Util.Tests.Assert_Equals (T, 16#01#, Integer (Data (2)), "Invalid value"); for I in 0 .. 9 loop Val := Interfaces.Shift_Left (1, 7 * I); Encode_LEB128 (Into => Data, Pos => Data'First, Val => Val, Last => Last); Util.Tests.Assert_Equals (T, I + 1, Integer (Last), "Invalid last position"); Decode_LEB128 (From => Data, Pos => Data'First, Val => Res, Last => Last); Util.Tests.Assert_Equals (T, I + 2, Integer (Last), "Invalid last position after decode"); T.Assert (Val = Res, "Invalid decode with I " & Integer'Image (I)); end loop; end Test_LEB128; end Util.Encoders.Tests;
flyx/OpenGLAda
Ada
1,129
adb
-- part of OpenGLAda, (c) 2017 Felix Krause -- released under the terms of the MIT license, see the file "COPYING" with GL.API; with GL.Enums.Getter; package body GL.Window is procedure Set_Viewport (X, Y : Int; Width, Height : Size) is begin GL.API.Viewport (X, Y, Width, Height); Raise_Exception_On_OpenGL_Error; end Set_Viewport; procedure Get_Viewport (X, Y : out Int; Width, Height : out Size) is Ret : Ints.Vector4; begin API.Get_Int_Vec4 (Enums.Getter.Viewport, Ret); Raise_Exception_On_OpenGL_Error; X := Ret (GL.X); Y := Ret (GL.Y); Width := Size (Ret (Z)); Height := Size (Ret (W)); end Get_Viewport; procedure Set_Depth_Range (Near, Far : Double) is begin API.Depth_Range (Near, Far); Raise_Exception_On_OpenGL_Error; end Set_Depth_Range; procedure Get_Depth_Range (Near, Far : out Double) is Ret : Doubles.Vector2; begin API.Get_Double_Vec2 (Enums.Getter.Depth_Range, Ret); Raise_Exception_On_OpenGL_Error; Near := Ret (X); Far := Ret (Y); end Get_Depth_Range; end GL.Window;
reznikmm/matreshka
Ada
254,604
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.DG_String_Data_00 is -- "opacity" MS_0000 : aliased Matreshka.Internals.Strings.Shared_String := (Capacity => 15, Unused => 7, Length => 7, Value => (16#006F#, 16#0070#, 16#0061#, 16#0063#, 16#0069#, 16#0074#, 16#0079#, others => 16#0000#), others => <>); -- "QuadraticCurveTo is a kind of path command that draws a quadratic bézier curve from the current point to a new point using a single control point." MS_0001 : aliased Matreshka.Internals.Strings.Shared_String := (Capacity => 151, Unused => 146, Length => 146, Value => (16#0051#, 16#0075#, 16#0061#, 16#0064#, 16#0072#, 16#0061#, 16#0074#, 16#0069#, 16#0063#, 16#0043#, 16#0075#, 16#0072#, 16#0076#, 16#0065#, 16#0054#, 16#006F#, 16#0020#, 16#0069#, 16#0073#, 16#0020#, 16#0061#, 16#0020#, 16#006B#, 16#0069#, 16#006E#, 16#0064#, 16#0020#, 16#006F#, 16#0066#, 16#0020#, 16#0070#, 16#0061#, 16#0074#, 16#0068#, 16#0020#, 16#0063#, 16#006F#, 16#006D#, 16#006D#, 16#0061#, 16#006E#, 16#0064#, 16#0020#, 16#0074#, 16#0068#, 16#0061#, 16#0074#, 16#0020#, 16#0064#, 16#0072#, 16#0061#, 16#0077#, 16#0073#, 16#0020#, 16#0061#, 16#0020#, 16#0071#, 16#0075#, 16#0061#, 16#0064#, 16#0072#, 16#0061#, 16#0074#, 16#0069#, 16#0063#, 16#0020#, 16#0062#, 16#00E9#, 16#007A#, 16#0069#, 16#0065#, 16#0072#, 16#0020#, 16#0063#, 16#0075#, 16#0072#, 16#0076#, 16#0065#, 16#0020#, 16#0066#, 16#0072#, 16#006F#, 16#006D#, 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#0070#, 16#006F#, 16#0069#, 16#006E#, 16#0074#, 16#0020#, 16#0074#, 16#006F#, 16#0020#, 16#0061#, 16#0020#, 16#006E#, 16#0065#, 16#0077#, 16#0020#, 16#0070#, 16#006F#, 16#0069#, 16#006E#, 16#0074#, 16#0020#, 16#0075#, 16#0073#, 16#0069#, 16#006E#, 16#0067#, 16#0020#, 16#0061#, 16#0020#, 16#0073#, 16#0069#, 16#006E#, 16#0067#, 16#006C#, 16#0065#, 16#0020#, 16#0063#, 16#006F#, 16#006E#, 16#0074#, 16#0072#, 16#006F#, 16#006C#, 16#0020#, 16#0070#, 16#006F#, 16#0069#, 16#006E#, 16#0074#, 16#002E#, others => 16#0000#), others => <>); -- "d" MS_0002 : aliased Matreshka.Internals.Strings.Shared_String := (Capacity => 7, Unused => 1, Length => 1, Value => (16#0064#, others => 16#0000#), others => <>); -- "the color of the font used to render a text element. The default is black (red=0, green=0, blue=0)." MS_0003 : aliased Matreshka.Internals.Strings.Shared_String := (Capacity => 103, Unused => 99, Length => 99, Value => (16#0074#, 16#0068#, 16#0065#, 16#0020#, 16#0063#, 16#006F#, 16#006C#, 16#006F#, 16#0072#, 16#0020#, 16#006F#, 16#0066#, 16#0020#, 16#0074#, 16#0068#, 16#0065#, 16#0020#, 16#0066#, 16#006F#, 16#006E#, 16#0074#, 16#0020#, 16#0075#, 16#0073#, 16#0065#, 16#0064#, 16#0020#, 16#0074#, 16#006F#, 16#0020#, 16#0072#, 16#0065#, 16#006E#, 16#0064#, 16#0065#, 16#0072#, 16#0020#, 16#0061#, 16#0020#, 16#0074#, 16#0065#, 16#0078#, 16#0074#, 16#0020#, 16#0065#, 16#006C#, 16#0065#, 16#006D#, 16#0065#, 16#006E#, 16#0074#, 16#002E#, 16#0020#, 16#0054#, 16#0068#, 16#0065#, 16#0020#, 16#0064#, 16#0065#, 16#0066#, 16#0061#, 16#0075#, 16#006C#, 16#0074#, 16#0020#, 16#0069#, 16#0073#, 16#0020#, 16#0062#, 16#006C#, 16#0061#, 16#0063#, 16#006B#, 16#0020#, 16#0028#, 16#0072#, 16#0065#, 16#0064#, 16#003D#, 16#0030#, 16#002C#, 16#0020#, 16#0067#, 16#0072#, 16#0065#, 16#0065#, 16#006E#, 16#003D#, 16#0030#, 16#002C#, 16#0020#, 16#0062#, 16#006C#, 16#0075#, 16#0065#, 16#003D#, 16#0030#, 16#0029#, 16#002E#, others => 16#0000#), others => <>); -- "the bounds inside which the text is rendered (possibly wrapped into multiple lines)" MS_0004 : aliased Matreshka.Internals.Strings.Shared_String := (Capacity => 87, Unused => 83, Length => 83, Value => (16#0074#, 16#0068#, 16#0065#, 16#0020#, 16#0062#, 16#006F#, 16#0075#, 16#006E#, 16#0064#, 16#0073#, 16#0020#, 16#0069#, 16#006E#, 16#0073#, 16#0069#, 16#0064#, 16#0065#, 16#0020#, 16#0077#, 16#0068#, 16#0069#, 16#0063#, 16#0068#, 16#0020#, 16#0074#, 16#0068#, 16#0065#, 16#0020#, 16#0074#, 16#0065#, 16#0078#, 16#0074#, 16#0020#, 16#0069#, 16#0073#, 16#0020#, 16#0072#, 16#0065#, 16#006E#, 16#0064#, 16#0065#, 16#0072#, 16#0065#, 16#0064#, 16#0020#, 16#0028#, 16#0070#, 16#006F#, 16#0073#, 16#0073#, 16#0069#, 16#0062#, 16#006C#, 16#0079#, 16#0020#, 16#0077#, 16#0072#, 16#0061#, 16#0070#, 16#0070#, 16#0065#, 16#0064#, 16#0020#, 16#0069#, 16#006E#, 16#0074#, 16#006F#, 16#0020#, 16#006D#, 16#0075#, 16#006C#, 16#0074#, 16#0069#, 16#0070#, 16#006C#, 16#0065#, 16#0020#, 16#006C#, 16#0069#, 16#006E#, 16#0065#, 16#0073#, 16#0029#, others => 16#0000#), others => <>); -- "the opacity of the fill is non-negative" MS_0005 : aliased Matreshka.Internals.Strings.Shared_String := (Capacity => 47, Unused => 39, Length => 39, Value => (16#0074#, 16#0068#, 16#0065#, 16#0020#, 16#006F#, 16#0070#, 16#0061#, 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#0066#, 16#0069#, 16#006C#, 16#006C#, 16#0020#, 16#0069#, 16#0073#, 16#0020#, 16#006E#, 16#006F#, 16#006E#, 16#002D#, 16#006E#, 16#0065#, 16#0067#, 16#0061#, 16#0074#, 16#0069#, 16#0076#, 16#0065#, others => 16#0000#), others => <>); -- "x1" MS_0006 : aliased Matreshka.Internals.Strings.Shared_String := (Capacity => 7, Unused => 2, Length => 2, Value => (16#0078#, 16#0031#, others => 16#0000#), others => <>); -- "The Diagram Graphics (DG) package contains a model of graphical primitives that can be instantiated when mapping from a language abstract syntax models and diagram interchange (DI) models to visual presentations. The mapping effectively defines the concrete syntax of a language. This specification does not restrict how the mappings are done, or what languages are used to define them." MS_0007 : aliased Matreshka.Internals.Strings.Shared_String := (Capacity => 399, Unused => 386, Length => 386, Value => (16#0054#, 16#0068#, 16#0065#, 16#0020#, 16#0044#, 16#0069#, 16#0061#, 16#0067#, 16#0072#, 16#0061#, 16#006D#, 16#0020#, 16#0047#, 16#0072#, 16#0061#, 16#0070#, 16#0068#, 16#0069#, 16#0063#, 16#0073#, 16#0020#, 16#0028#, 16#0044#, 16#0047#, 16#0029#, 16#0020#, 16#0070#, 16#0061#, 16#0063#, 16#006B#, 16#0061#, 16#0067#, 16#0065#, 16#0020#, 16#0063#, 16#006F#, 16#006E#, 16#0074#, 16#0061#, 16#0069#, 16#006E#, 16#0073#, 16#0020#, 16#0061#, 16#0020#, 16#006D#, 16#006F#, 16#0064#, 16#0065#, 16#006C#, 16#0020#, 16#006F#, 16#0066#, 16#0020#, 16#0067#, 16#0072#, 16#0061#, 16#0070#, 16#0068#, 16#0069#, 16#0063#, 16#0061#, 16#006C#, 16#0020#, 16#0070#, 16#0072#, 16#0069#, 16#006D#, 16#0069#, 16#0074#, 16#0069#, 16#0076#, 16#0065#, 16#0073#, 16#0020#, 16#0074#, 16#0068#, 16#0061#, 16#0074#, 16#0020#, 16#0063#, 16#0061#, 16#006E#, 16#0020#, 16#0062#, 16#0065#, 16#0020#, 16#0069#, 16#006E#, 16#0073#, 16#0074#, 16#0061#, 16#006E#, 16#0074#, 16#0069#, 16#0061#, 16#0074#, 16#0065#, 16#0064#, 16#0020#, 16#0077#, 16#0068#, 16#0065#, 16#006E#, 16#0020#, 16#006D#, 16#0061#, 16#0070#, 16#0070#, 16#0069#, 16#006E#, 16#0067#, 16#0020#, 16#0066#, 16#0072#, 16#006F#, 16#006D#, 16#0020#, 16#0061#, 16#0020#, 16#006C#, 16#0061#, 16#006E#, 16#0067#, 16#0075#, 16#0061#, 16#0067#, 16#0065#, 16#0020#, 16#0061#, 16#0062#, 16#0073#, 16#0074#, 16#0072#, 16#0061#, 16#0063#, 16#0074#, 16#0020#, 16#0073#, 16#0079#, 16#006E#, 16#0074#, 16#0061#, 16#0078#, 16#0020#, 16#006D#, 16#006F#, 16#0064#, 16#0065#, 16#006C#, 16#0073#, 16#0020#, 16#0061#, 16#006E#, 16#0064#, 16#0020#, 16#0064#, 16#0069#, 16#0061#, 16#0067#, 16#0072#, 16#0061#, 16#006D#, 16#0020#, 16#0069#, 16#006E#, 16#0074#, 16#0065#, 16#0072#, 16#0063#, 16#0068#, 16#0061#, 16#006E#, 16#0067#, 16#0065#, 16#0020#, 16#0028#, 16#0044#, 16#0049#, 16#0029#, 16#0020#, 16#006D#, 16#006F#, 16#0064#, 16#0065#, 16#006C#, 16#0073#, 16#0020#, 16#0074#, 16#006F#, 16#0020#, 16#0076#, 16#0069#, 16#0073#, 16#0075#, 16#0061#, 16#006C#, 16#0020#, 16#0070#, 16#0072#, 16#0065#, 16#0073#, 16#0065#, 16#006E#, 16#0074#, 16#0061#, 16#0074#, 16#0069#, 16#006F#, 16#006E#, 16#0073#, 16#002E#, 16#0020#, 16#0054#, 16#0068#, 16#0065#, 16#0020#, 16#006D#, 16#0061#, 16#0070#, 16#0070#, 16#0069#, 16#006E#, 16#0067#, 16#0020#, 16#0065#, 16#0066#, 16#0066#, 16#0065#, 16#0063#, 16#0074#, 16#0069#, 16#0076#, 16#0065#, 16#006C#, 16#0079#, 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#006E#, 16#0063#, 16#0072#, 16#0065#, 16#0074#, 16#0065#, 16#0020#, 16#0073#, 16#0079#, 16#006E#, 16#0074#, 16#0061#, 16#0078#, 16#0020#, 16#006F#, 16#0066#, 16#0020#, 16#0061#, 16#0020#, 16#006C#, 16#0061#, 16#006E#, 16#0067#, 16#0075#, 16#0061#, 16#0067#, 16#0065#, 16#002E#, 16#0020#, 16#0054#, 16#0068#, 16#0069#, 16#0073#, 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#006F#, 16#0065#, 16#0073#, 16#0020#, 16#006E#, 16#006F#, 16#0074#, 16#0020#, 16#0072#, 16#0065#, 16#0073#, 16#0074#, 16#0072#, 16#0069#, 16#0063#, 16#0074#, 16#0020#, 16#0068#, 16#006F#, 16#0077#, 16#0020#, 16#0074#, 16#0068#, 16#0065#, 16#0020#, 16#006D#, 16#0061#, 16#0070#, 16#0070#, 16#0069#, 16#006E#, 16#0067#, 16#0073#, 16#0020#, 16#0061#, 16#0072#, 16#0065#, 16#0020#, 16#0064#, 16#006F#, 16#006E#, 16#0065#, 16#002C#, 16#0020#, 16#006F#, 16#0072#, 16#0020#, 16#0077#, 16#0068#, 16#0061#, 16#0074#, 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#0073#, 16#0065#, 16#0064#, 16#0020#, 16#0074#, 16#006F#, 16#0020#, 16#0064#, 16#0065#, 16#0066#, 16#0069#, 16#006E#, 16#0065#, 16#0020#, 16#0074#, 16#0068#, 16#0065#, 16#006D#, 16#002E#, others => 16#0000#), others => <>); -- "the text as a string of characters." MS_0008 : aliased Matreshka.Internals.Strings.Shared_String := (Capacity => 39, Unused => 35, Length => 35, Value => (16#0074#, 16#0068#, 16#0065#, 16#0020#, 16#0074#, 16#0065#, 16#0078#, 16#0074#, 16#0020#, 16#0061#, 16#0073#, 16#0020#, 16#0061#, 16#0020#, 16#0073#, 16#0074#, 16#0072#, 16#0069#, 16#006E#, 16#0067#, 16#0020#, 16#006F#, 16#0066#, 16#0020#, 16#0063#, 16#0068#, 16#0061#, 16#0072#, 16#0061#, 16#0063#, 16#0074#, 16#0065#, 16#0072#, 16#0073#, 16#002E#, others => 16#0000#), others => <>); -- "Scale is a kind of transform that scales (resizes) a graphical element by a given factor in the x-y coordinate system." MS_0009 : aliased Matreshka.Internals.Strings.Shared_String := (Capacity => 127, Unused => 118, Length => 118, Value => (16#0053#, 16#0063#, 16#0061#, 16#006C#, 16#0065#, 16#0020#, 16#0069#, 16#0073#, 16#0020#, 16#0061#, 16#0020#, 16#006B#, 16#0069#, 16#006E#, 16#0064#, 16#0020#, 16#006F#, 16#0066#, 16#0020#, 16#0074#, 16#0072#, 16#0061#, 16#006E#, 16#0073#, 16#0066#, 16#006F#, 16#0072#, 16#006D#, 16#0020#, 16#0074#, 16#0068#, 16#0061#, 16#0074#, 16#0020#, 16#0073#, 16#0063#, 16#0061#, 16#006C#, 16#0065#, 16#0073#, 16#0020#, 16#0028#, 16#0072#, 16#0065#, 16#0073#, 16#0069#, 16#007A#, 16#0065#, 16#0073#, 16#0029#, 16#0020#, 16#0061#, 16#0020#, 16#0067#, 16#0072#, 16#0061#, 16#0070#, 16#0068#, 16#0069#, 16#0063#, 16#0061#, 16#006C#, 16#0020#, 16#0065#, 16#006C#, 16#0065#, 16#006D#, 16#0065#, 16#006E#, 16#0074#, 16#0020#, 16#0062#, 16#0079#, 16#0020#, 16#0061#, 16#0020#, 16#0067#, 16#0069#, 16#0076#, 16#0065#, 16#006E#, 16#0020#, 16#0066#, 16#0061#, 16#0063#, 16#0074#, 16#006F#, 16#0072#, 16#0020#, 16#0069#, 16#006E#, 16#0020#, 16#0074#, 16#0068#, 16#0065#, 16#0020#, 16#0078#, 16#002D#, 16#0079#, 16#0020#, 16#0063#, 16#006F#, 16#006F#, 16#0072#, 16#0064#, 16#0069#, 16#006E#, 16#0061#, 16#0074#, 16#0065#, 16#0020#, 16#0073#, 16#0079#, 16#0073#, 16#0074#, 16#0065#, 16#006D#, 16#002E#, others => 16#0000#), others => <>); -- "Gradient is a kind of fill that paints a continuously smooth color transition along the gradient range from one color to the next." MS_000A : aliased Matreshka.Internals.Strings.Shared_String := (Capacity => 135, Unused => 130, Length => 130, Value => (16#0047#, 16#0072#, 16#0061#, 16#0064#, 16#0069#, 16#0065#, 16#006E#, 16#0074#, 16#0020#, 16#0069#, 16#0073#, 16#0020#, 16#0061#, 16#0020#, 16#006B#, 16#0069#, 16#006E#, 16#0064#, 16#0020#, 16#006F#, 16#0066#, 16#0020#, 16#0066#, 16#0069#, 16#006C#, 16#006C#, 16#0020#, 16#0074#, 16#0068#, 16#0061#, 16#0074#, 16#0020#, 16#0070#, 16#0061#, 16#0069#, 16#006E#, 16#0074#, 16#0073#, 16#0020#, 16#0061#, 16#0020#, 16#0063#, 16#006F#, 16#006E#, 16#0074#, 16#0069#, 16#006E#, 16#0075#, 16#006F#, 16#0075#, 16#0073#, 16#006C#, 16#0079#, 16#0020#, 16#0073#, 16#006D#, 16#006F#, 16#006F#, 16#0074#, 16#0068#, 16#0020#, 16#0063#, 16#006F#, 16#006C#, 16#006F#, 16#0072#, 16#0020#, 16#0074#, 16#0072#, 16#0061#, 16#006E#, 16#0073#, 16#0069#, 16#0074#, 16#0069#, 16#006F#, 16#006E#, 16#0020#, 16#0061#, 16#006C#, 16#006F#, 16#006E#, 16#0067#, 16#0020#, 16#0074#, 16#0068#, 16#0065#, 16#0020#, 16#0067#, 16#0072#, 16#0061#, 16#0064#, 16#0069#, 16#0065#, 16#006E#, 16#0074#, 16#0020#, 16#0072#, 16#0061#, 16#006E#, 16#0067#, 16#0065#, 16#0020#, 16#0066#, 16#0072#, 16#006F#, 16#006D#, 16#0020#, 16#006F#, 16#006E#, 16#0065#, 16#0020#, 16#0063#, 16#006F#, 16#006C#, 16#006F#, 16#0072#, 16#0020#, 16#0074#, 16#006F#, 16#0020#, 16#0074#, 16#0068#, 16#0065#, 16#0020#, 16#006E#, 16#0065#, 16#0078#, 16#0074#, 16#002E#, others => 16#0000#), others => <>); -- "a reference to the canvas that owns this fill." MS_000B : aliased Matreshka.Internals.Strings.Shared_String := (Capacity => 47, Unused => 46, Length => 46, Value => (16#0061#, 16#0020#, 16#0072#, 16#0065#, 16#0066#, 16#0065#, 16#0072#, 16#0065#, 16#006E#, 16#0063#, 16#0065#, 16#0020#, 16#0074#, 16#006F#, 16#0020#, 16#0074#, 16#0068#, 16#0065#, 16#0020#, 16#0063#, 16#0061#, 16#006E#, 16#0076#, 16#0061#, 16#0073#, 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#0066#, 16#0069#, 16#006C#, 16#006C#, 16#002E#, others => 16#0000#), others => <>); -- "the c value of the transform matrix." MS_000C : aliased Matreshka.Internals.Strings.Shared_String := (Capacity => 39, Unused => 36, Length => 36, Value => (16#0074#, 16#0068#, 16#0065#, 16#0020#, 16#0063#, 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#0074#, 16#0072#, 16#0061#, 16#006E#, 16#0073#, 16#0066#, 16#006F#, 16#0072#, 16#006D#, 16#0020#, 16#006D#, 16#0061#, 16#0074#, 16#0072#, 16#0069#, 16#0078#, 16#002E#, others => 16#0000#), others => <>); -- "whether the coordinates specified by the command are relative to the current point (when true) or to the origin point of the coordinate system (when false)." MS_000D : aliased Matreshka.Internals.Strings.Shared_String := (Capacity => 167, Unused => 156, Length => 156, Value => (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#0063#, 16#006F#, 16#006F#, 16#0072#, 16#0064#, 16#0069#, 16#006E#, 16#0061#, 16#0074#, 16#0065#, 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#0074#, 16#0068#, 16#0065#, 16#0020#, 16#0063#, 16#006F#, 16#006D#, 16#006D#, 16#0061#, 16#006E#, 16#0064#, 16#0020#, 16#0061#, 16#0072#, 16#0065#, 16#0020#, 16#0072#, 16#0065#, 16#006C#, 16#0061#, 16#0074#, 16#0069#, 16#0076#, 16#0065#, 16#0020#, 16#0074#, 16#006F#, 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#0070#, 16#006F#, 16#0069#, 16#006E#, 16#0074#, 16#0020#, 16#0028#, 16#0077#, 16#0068#, 16#0065#, 16#006E#, 16#0020#, 16#0074#, 16#0072#, 16#0075#, 16#0065#, 16#0029#, 16#0020#, 16#006F#, 16#0072#, 16#0020#, 16#0074#, 16#006F#, 16#0020#, 16#0074#, 16#0068#, 16#0065#, 16#0020#, 16#006F#, 16#0072#, 16#0069#, 16#0067#, 16#0069#, 16#006E#, 16#0020#, 16#0070#, 16#006F#, 16#0069#, 16#006E#, 16#0074#, 16#0020#, 16#006F#, 16#0066#, 16#0020#, 16#0074#, 16#0068#, 16#0065#, 16#0020#, 16#0063#, 16#006F#, 16#006F#, 16#0072#, 16#0064#, 16#0069#, 16#006E#, 16#0061#, 16#0074#, 16#0065#, 16#0020#, 16#0073#, 16#0079#, 16#0073#, 16#0074#, 16#0065#, 16#006D#, 16#0020#, 16#0028#, 16#0077#, 16#0068#, 16#0065#, 16#006E#, 16#0020#, 16#0066#, 16#0061#, 16#006C#, 16#0073#, 16#0065#, 16#0029#, 16#002E#, others => 16#0000#), others => <>); -- "centerX" MS_000E : aliased Matreshka.Internals.Strings.Shared_String := (Capacity => 15, Unused => 7, Length => 7, Value => (16#0063#, 16#0065#, 16#006E#, 16#0074#, 16#0065#, 16#0072#, 16#0058#, others => 16#0000#), others => <>); -- "Image is a graphical element that defines a shape that paints an image with a given URL within given bounds." MS_000F : aliased Matreshka.Internals.Strings.Shared_String := (Capacity => 111, Unused => 108, Length => 108, Value => (16#0049#, 16#006D#, 16#0061#, 16#0067#, 16#0065#, 16#0020#, 16#0069#, 16#0073#, 16#0020#, 16#0061#, 16#0020#, 16#0067#, 16#0072#, 16#0061#, 16#0070#, 16#0068#, 16#0069#, 16#0063#, 16#0061#, 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#0064#, 16#0065#, 16#0066#, 16#0069#, 16#006E#, 16#0065#, 16#0073#, 16#0020#, 16#0061#, 16#0020#, 16#0073#, 16#0068#, 16#0061#, 16#0070#, 16#0065#, 16#0020#, 16#0074#, 16#0068#, 16#0061#, 16#0074#, 16#0020#, 16#0070#, 16#0061#, 16#0069#, 16#006E#, 16#0074#, 16#0073#, 16#0020#, 16#0061#, 16#006E#, 16#0020#, 16#0069#, 16#006D#, 16#0061#, 16#0067#, 16#0065#, 16#0020#, 16#0077#, 16#0069#, 16#0074#, 16#0068#, 16#0020#, 16#0061#, 16#0020#, 16#0067#, 16#0069#, 16#0076#, 16#0065#, 16#006E#, 16#0020#, 16#0055#, 16#0052#, 16#004C#, 16#0020#, 16#0077#, 16#0069#, 16#0074#, 16#0068#, 16#0069#, 16#006E#, 16#0020#, 16#0067#, 16#0069#, 16#0076#, 16#0065#, 16#006E#, 16#0020#, 16#0062#, 16#006F#, 16#0075#, 16#006E#, 16#0064#, 16#0073#, 16#002E#, others => 16#0000#), others => <>); -- "the e value of the transform matrix." MS_0010 : aliased Matreshka.Internals.Strings.Shared_String := (Capacity => 39, Unused => 36, Length => 36, Value => (16#0074#, 16#0068#, 16#0065#, 16#0020#, 16#0065#, 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#0074#, 16#0072#, 16#0061#, 16#006E#, 16#0073#, 16#0066#, 16#006F#, 16#0072#, 16#006D#, 16#0020#, 16#006D#, 16#0061#, 16#0074#, 16#0072#, 16#0069#, 16#0078#, 16#002E#, others => 16#0000#), others => <>); -- "valid_center_point" MS_0011 : aliased Matreshka.Internals.Strings.Shared_String := (Capacity => 23, Unused => 18, Length => 18, Value => (16#0076#, 16#0061#, 16#006C#, 16#0069#, 16#0064#, 16#005F#, 16#0063#, 16#0065#, 16#006E#, 16#0074#, 16#0065#, 16#0072#, 16#005F#, 16#0070#, 16#006F#, 16#0069#, 16#006E#, 16#0074#, others => 16#0000#), others => <>); -- "a radius for the rectangle's rounded corners. When the radius is 0, the rectangle is drawn with sharp corners." MS_0012 : aliased Matreshka.Internals.Strings.Shared_String := (Capacity => 119, Unused => 110, Length => 110, Value => (16#0061#, 16#0020#, 16#0072#, 16#0061#, 16#0064#, 16#0069#, 16#0075#, 16#0073#, 16#0020#, 16#0066#, 16#006F#, 16#0072#, 16#0020#, 16#0074#, 16#0068#, 16#0065#, 16#0020#, 16#0072#, 16#0065#, 16#0063#, 16#0074#, 16#0061#, 16#006E#, 16#0067#, 16#006C#, 16#0065#, 16#0027#, 16#0073#, 16#0020#, 16#0072#, 16#006F#, 16#0075#, 16#006E#, 16#0064#, 16#0065#, 16#0064#, 16#0020#, 16#0063#, 16#006F#, 16#0072#, 16#006E#, 16#0065#, 16#0072#, 16#0073#, 16#002E#, 16#0020#, 16#0057#, 16#0068#, 16#0065#, 16#006E#, 16#0020#, 16#0074#, 16#0068#, 16#0065#, 16#0020#, 16#0072#, 16#0061#, 16#0064#, 16#0069#, 16#0075#, 16#0073#, 16#0020#, 16#0069#, 16#0073#, 16#0020#, 16#0030#, 16#002C#, 16#0020#, 16#0074#, 16#0068#, 16#0065#, 16#0020#, 16#0072#, 16#0065#, 16#0063#, 16#0074#, 16#0061#, 16#006E#, 16#0067#, 16#006C#, 16#0065#, 16#0020#, 16#0069#, 16#0073#, 16#0020#, 16#0064#, 16#0072#, 16#0061#, 16#0077#, 16#006E#, 16#0020#, 16#0077#, 16#0069#, 16#0074#, 16#0068#, 16#0020#, 16#0073#, 16#0068#, 16#0061#, 16#0072#, 16#0070#, 16#0020#, 16#0063#, 16#006F#, 16#0072#, 16#006E#, 16#0065#, 16#0072#, 16#0073#, 16#002E#, others => 16#0000#), others => <>); -- "a point to move to in the coordinate system" MS_0013 : aliased Matreshka.Internals.Strings.Shared_String := (Capacity => 47, Unused => 43, Length => 43, Value => (16#0061#, 16#0020#, 16#0070#, 16#006F#, 16#0069#, 16#006E#, 16#0074#, 16#0020#, 16#0074#, 16#006F#, 16#0020#, 16#006D#, 16#006F#, 16#0076#, 16#0065#, 16#0020#, 16#0074#, 16#006F#, 16#0020#, 16#0069#, 16#006E#, 16#0020#, 16#0074#, 16#0068#, 16#0065#, 16#0020#, 16#0063#, 16#006F#, 16#006F#, 16#0072#, 16#0064#, 16#0069#, 16#006E#, 16#0061#, 16#0074#, 16#0065#, 16#0020#, 16#0073#, 16#0079#, 16#0073#, 16#0074#, 16#0065#, 16#006D#, others => 16#0000#), others => <>); -- "tile" MS_0014 : aliased Matreshka.Internals.Strings.Shared_String := (Capacity => 7, Unused => 4, Length => 4, Value => (16#0074#, 16#0069#, 16#006C#, 16#0065#, others => 16#0000#), others => <>); -- "Skew" MS_0015 : aliased Matreshka.Internals.Strings.Shared_String := (Capacity => 7, Unused => 4, Length => 4, Value => (16#0053#, 16#006B#, 16#0065#, 16#0077#, others => 16#0000#), others => <>); -- "group" MS_0016 : aliased Matreshka.Internals.Strings.Shared_String := (Capacity => 7, Unused => 5, Length => 5, Value => (16#0067#, 16#0072#, 16#006F#, 16#0075#, 16#0070#, others => 16#0000#), others => <>); -- "clippedElement" MS_0017 : aliased Matreshka.Internals.Strings.Shared_String := (Capacity => 15, Unused => 14, Length => 14, Value => (16#0063#, 16#006C#, 16#0069#, 16#0070#, 16#0070#, 16#0065#, 16#0064#, 16#0045#, 16#006C#, 16#0065#, 16#006D#, 16#0065#, 16#006E#, 16#0074#, others => 16#0000#), others => <>); -- "a reference to a graphical element, owned by the pattern, that works as a tile to be painted repeatedly at a fixed interval to fill an closed area." MS_0018 : aliased Matreshka.Internals.Strings.Shared_String := (Capacity => 151, Unused => 147, Length => 147, Value => (16#0061#, 16#0020#, 16#0072#, 16#0065#, 16#0066#, 16#0065#, 16#0072#, 16#0065#, 16#006E#, 16#0063#, 16#0065#, 16#0020#, 16#0074#, 16#006F#, 16#0020#, 16#0061#, 16#0020#, 16#0067#, 16#0072#, 16#0061#, 16#0070#, 16#0068#, 16#0069#, 16#0063#, 16#0061#, 16#006C#, 16#0020#, 16#0065#, 16#006C#, 16#0065#, 16#006D#, 16#0065#, 16#006E#, 16#0074#, 16#002C#, 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#0070#, 16#0061#, 16#0074#, 16#0074#, 16#0065#, 16#0072#, 16#006E#, 16#002C#, 16#0020#, 16#0074#, 16#0068#, 16#0061#, 16#0074#, 16#0020#, 16#0077#, 16#006F#, 16#0072#, 16#006B#, 16#0073#, 16#0020#, 16#0061#, 16#0073#, 16#0020#, 16#0061#, 16#0020#, 16#0074#, 16#0069#, 16#006C#, 16#0065#, 16#0020#, 16#0074#, 16#006F#, 16#0020#, 16#0062#, 16#0065#, 16#0020#, 16#0070#, 16#0061#, 16#0069#, 16#006E#, 16#0074#, 16#0065#, 16#0064#, 16#0020#, 16#0072#, 16#0065#, 16#0070#, 16#0065#, 16#0061#, 16#0074#, 16#0065#, 16#0064#, 16#006C#, 16#0079#, 16#0020#, 16#0061#, 16#0074#, 16#0020#, 16#0061#, 16#0020#, 16#0066#, 16#0069#, 16#0078#, 16#0065#, 16#0064#, 16#0020#, 16#0069#, 16#006E#, 16#0074#, 16#0065#, 16#0072#, 16#0076#, 16#0061#, 16#006C#, 16#0020#, 16#0074#, 16#006F#, 16#0020#, 16#0066#, 16#0069#, 16#006C#, 16#006C#, 16#0020#, 16#0061#, 16#006E#, 16#0020#, 16#0063#, 16#006C#, 16#006F#, 16#0073#, 16#0065#, 16#0064#, 16#0020#, 16#0061#, 16#0072#, 16#0065#, 16#0061#, 16#002E#, others => 16#0000#), others => <>); -- "0.5" MS_0019 : aliased Matreshka.Internals.Strings.Shared_String := (Capacity => 7, Unused => 3, Length => 3, Value => (16#0030#, 16#002E#, 16#0035#, others => 16#0000#), others => <>); -- "Transform defines an operation that changes the geometry of a graphical element in a specific way." MS_001A : aliased Matreshka.Internals.Strings.Shared_String := (Capacity => 103, Unused => 98, Length => 98, Value => (16#0054#, 16#0072#, 16#0061#, 16#006E#, 16#0073#, 16#0066#, 16#006F#, 16#0072#, 16#006D#, 16#0020#, 16#0064#, 16#0065#, 16#0066#, 16#0069#, 16#006E#, 16#0065#, 16#0073#, 16#0020#, 16#0061#, 16#006E#, 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#0068#, 16#0061#, 16#0074#, 16#0020#, 16#0063#, 16#0068#, 16#0061#, 16#006E#, 16#0067#, 16#0065#, 16#0073#, 16#0020#, 16#0074#, 16#0068#, 16#0065#, 16#0020#, 16#0067#, 16#0065#, 16#006F#, 16#006D#, 16#0065#, 16#0074#, 16#0072#, 16#0079#, 16#0020#, 16#006F#, 16#0066#, 16#0020#, 16#0061#, 16#0020#, 16#0067#, 16#0072#, 16#0061#, 16#0070#, 16#0068#, 16#0069#, 16#0063#, 16#0061#, 16#006C#, 16#0020#, 16#0065#, 16#006C#, 16#0065#, 16#006D#, 16#0065#, 16#006E#, 16#0074#, 16#0020#, 16#0069#, 16#006E#, 16#0020#, 16#0061#, 16#0020#, 16#0073#, 16#0070#, 16#0065#, 16#0063#, 16#0069#, 16#0066#, 16#0069#, 16#0063#, 16#0020#, 16#0077#, 16#0061#, 16#0079#, 16#002E#, others => 16#0000#), others => <>); -- "A_endMarker_markedElement" MS_001B : aliased Matreshka.Internals.Strings.Shared_String := (Capacity => 31, Unused => 25, Length => 25, Value => (16#0041#, 16#005F#, 16#0065#, 16#006E#, 16#0064#, 16#004D#, 16#0061#, 16#0072#, 16#006B#, 16#0065#, 16#0072#, 16#005F#, 16#006D#, 16#0061#, 16#0072#, 16#006B#, 16#0065#, 16#0064#, 16#0045#, 16#006C#, 16#0065#, 16#006D#, 16#0065#, 16#006E#, 16#0074#, others => 16#0000#), others => <>); -- "a list of two or more gradient stops defining the color transitions of the gradient." MS_001C : aliased Matreshka.Internals.Strings.Shared_String := (Capacity => 87, Unused => 84, Length => 84, Value => (16#0061#, 16#0020#, 16#006C#, 16#0069#, 16#0073#, 16#0074#, 16#0020#, 16#006F#, 16#0066#, 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#0067#, 16#0072#, 16#0061#, 16#0064#, 16#0069#, 16#0065#, 16#006E#, 16#0074#, 16#0020#, 16#0073#, 16#0074#, 16#006F#, 16#0070#, 16#0073#, 16#0020#, 16#0064#, 16#0065#, 16#0066#, 16#0069#, 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#006F#, 16#0072#, 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#0066#, 16#0020#, 16#0074#, 16#0068#, 16#0065#, 16#0020#, 16#0067#, 16#0072#, 16#0061#, 16#0064#, 16#0069#, 16#0065#, 16#006E#, 16#0074#, 16#002E#, others => 16#0000#), others => <>); -- "fontUnderline" MS_001D : aliased Matreshka.Internals.Strings.Shared_String := (Capacity => 15, Unused => 13, Length => 13, Value => (16#0066#, 16#006F#, 16#006E#, 16#0074#, 16#0055#, 16#006E#, 16#0064#, 16#0065#, 16#0072#, 16#006C#, 16#0069#, 16#006E#, 16#0065#, others => 16#0000#), others => <>); -- "a real number representing a translate delta along the x-axis. Both positive and negative values are allowed." MS_001E : aliased Matreshka.Internals.Strings.Shared_String := (Capacity => 119, Unused => 109, Length => 109, Value => (16#0061#, 16#0020#, 16#0072#, 16#0065#, 16#0061#, 16#006C#, 16#0020#, 16#006E#, 16#0075#, 16#006D#, 16#0062#, 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#0069#, 16#006E#, 16#0067#, 16#0020#, 16#0061#, 16#0020#, 16#0074#, 16#0072#, 16#0061#, 16#006E#, 16#0073#, 16#006C#, 16#0061#, 16#0074#, 16#0065#, 16#0020#, 16#0064#, 16#0065#, 16#006C#, 16#0074#, 16#0061#, 16#0020#, 16#0061#, 16#006C#, 16#006F#, 16#006E#, 16#0067#, 16#0020#, 16#0074#, 16#0068#, 16#0065#, 16#0020#, 16#0078#, 16#002D#, 16#0061#, 16#0078#, 16#0069#, 16#0073#, 16#002E#, 16#0020#, 16#0042#, 16#006F#, 16#0074#, 16#0068#, 16#0020#, 16#0070#, 16#006F#, 16#0073#, 16#0069#, 16#0074#, 16#0069#, 16#0076#, 16#0065#, 16#0020#, 16#0061#, 16#006E#, 16#0064#, 16#0020#, 16#006E#, 16#0065#, 16#0067#, 16#0061#, 16#0074#, 16#0069#, 16#0076#, 16#0065#, 16#0020#, 16#0076#, 16#0061#, 16#006C#, 16#0075#, 16#0065#, 16#0073#, 16#0020#, 16#0061#, 16#0072#, 16#0065#, 16#0020#, 16#0061#, 16#006C#, 16#006C#, 16#006F#, 16#0077#, 16#0065#, 16#0064#, 16#002E#, others => 16#0000#), others => <>); -- "Polyline is a marked element that defines a shape consisting of a sequence of connected straight line segments." MS_001F : aliased Matreshka.Internals.Strings.Shared_String := (Capacity => 119, Unused => 111, Length => 111, Value => (16#0050#, 16#006F#, 16#006C#, 16#0079#, 16#006C#, 16#0069#, 16#006E#, 16#0065#, 16#0020#, 16#0069#, 16#0073#, 16#0020#, 16#0061#, 16#0020#, 16#006D#, 16#0061#, 16#0072#, 16#006B#, 16#0065#, 16#0064#, 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#0064#, 16#0065#, 16#0066#, 16#0069#, 16#006E#, 16#0065#, 16#0073#, 16#0020#, 16#0061#, 16#0020#, 16#0073#, 16#0068#, 16#0061#, 16#0070#, 16#0065#, 16#0020#, 16#0063#, 16#006F#, 16#006E#, 16#0073#, 16#0069#, 16#0073#, 16#0074#, 16#0069#, 16#006E#, 16#0067#, 16#0020#, 16#006F#, 16#0066#, 16#0020#, 16#0061#, 16#0020#, 16#0073#, 16#0065#, 16#0071#, 16#0075#, 16#0065#, 16#006E#, 16#0063#, 16#0065#, 16#0020#, 16#006F#, 16#0066#, 16#0020#, 16#0063#, 16#006F#, 16#006E#, 16#006E#, 16#0065#, 16#0063#, 16#0074#, 16#0065#, 16#0064#, 16#0020#, 16#0073#, 16#0074#, 16#0072#, 16#0061#, 16#0069#, 16#0067#, 16#0068#, 16#0074#, 16#0020#, 16#006C#, 16#0069#, 16#006E#, 16#0065#, 16#0020#, 16#0073#, 16#0065#, 16#0067#, 16#006D#, 16#0065#, 16#006E#, 16#0074#, 16#0073#, 16#002E#, others => 16#0000#), others => <>); -- "the offset must be between 0 and 1." MS_0020 : aliased Matreshka.Internals.Strings.Shared_String := (Capacity => 39, Unused => 35, Length => 35, Value => (16#0074#, 16#0068#, 16#0065#, 16#0020#, 16#006F#, 16#0066#, 16#0066#, 16#0073#, 16#0065#, 16#0074#, 16#0020#, 16#006D#, 16#0075#, 16#0073#, 16#0074#, 16#0020#, 16#0062#, 16#0065#, 16#0020#, 16#0062#, 16#0065#, 16#0074#, 16#0077#, 16#0065#, 16#0065#, 16#006E#, 16#0020#, 16#0030#, 16#0020#, 16#0061#, 16#006E#, 16#0064#, 16#0020#, 16#0031#, 16#002E#, others => 16#0000#), others => <>); -- "Matrix" MS_0021 : aliased Matreshka.Internals.Strings.Shared_String := (Capacity => 7, Unused => 6, Length => 6, Value => (16#004D#, 16#0061#, 16#0074#, 16#0072#, 16#0069#, 16#0078#, others => 16#0000#), others => <>); -- "fillColor" MS_0022 : aliased Matreshka.Internals.Strings.Shared_String := (Capacity => 15, Unused => 9, Length => 9, Value => (16#0066#, 16#0069#, 16#006C#, 16#006C#, 16#0043#, 16#006F#, 16#006C#, 16#006F#, 16#0072#, others => 16#0000#), others => <>); -- "end" MS_0023 : aliased Matreshka.Internals.Strings.Shared_String := (Capacity => 7, Unused => 3, Length => 3, Value => (16#0065#, 16#006E#, 16#0064#, others => 16#0000#), others => <>); -- "non_negative_radius" MS_0024 : aliased Matreshka.Internals.Strings.Shared_String := (Capacity => 23, Unused => 19, Length => 19, Value => (16#006E#, 16#006F#, 16#006E#, 16#005F#, 16#006E#, 16#0065#, 16#0067#, 16#0061#, 16#0074#, 16#0069#, 16#0076#, 16#0065#, 16#005F#, 16#0072#, 16#0061#, 16#0064#, 16#0069#, 16#0075#, 16#0073#, others => 16#0000#), others => <>); -- "x2" MS_0025 : aliased Matreshka.Internals.Strings.Shared_String := (Capacity => 7, Unused => 2, Length => 2, Value => (16#0078#, 16#0032#, others => 16#0000#), others => <>); -- "startControl" MS_0026 : aliased Matreshka.Internals.Strings.Shared_String := (Capacity => 15, Unused => 12, Length => 12, Value => (16#0073#, 16#0074#, 16#0061#, 16#0072#, 16#0074#, 16#0043#, 16#006F#, 16#006E#, 16#0074#, 16#0072#, 16#006F#, 16#006C#, others => 16#0000#), others => <>); -- "Fill" MS_0027 : aliased Matreshka.Internals.Strings.Shared_String := (Capacity => 7, Unused => 4, Length => 4, Value => (16#0046#, 16#0069#, 16#006C#, 16#006C#, others => 16#0000#), others => <>); -- "Ellipse is a graphical element that defines an elliptical shape with a given center point and two radii on the x and y axes." MS_0028 : aliased Matreshka.Internals.Strings.Shared_String := (Capacity => 127, Unused => 124, Length => 124, Value => (16#0045#, 16#006C#, 16#006C#, 16#0069#, 16#0070#, 16#0073#, 16#0065#, 16#0020#, 16#0069#, 16#0073#, 16#0020#, 16#0061#, 16#0020#, 16#0067#, 16#0072#, 16#0061#, 16#0070#, 16#0068#, 16#0069#, 16#0063#, 16#0061#, 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#0064#, 16#0065#, 16#0066#, 16#0069#, 16#006E#, 16#0065#, 16#0073#, 16#0020#, 16#0061#, 16#006E#, 16#0020#, 16#0065#, 16#006C#, 16#006C#, 16#0069#, 16#0070#, 16#0074#, 16#0069#, 16#0063#, 16#0061#, 16#006C#, 16#0020#, 16#0073#, 16#0068#, 16#0061#, 16#0070#, 16#0065#, 16#0020#, 16#0077#, 16#0069#, 16#0074#, 16#0068#, 16#0020#, 16#0061#, 16#0020#, 16#0067#, 16#0069#, 16#0076#, 16#0065#, 16#006E#, 16#0020#, 16#0063#, 16#0065#, 16#006E#, 16#0074#, 16#0065#, 16#0072#, 16#0020#, 16#0070#, 16#006F#, 16#0069#, 16#006E#, 16#0074#, 16#0020#, 16#0061#, 16#006E#, 16#0064#, 16#0020#, 16#0074#, 16#0077#, 16#006F#, 16#0020#, 16#0072#, 16#0061#, 16#0064#, 16#0069#, 16#0069#, 16#0020#, 16#006F#, 16#006E#, 16#0020#, 16#0074#, 16#0068#, 16#0065#, 16#0020#, 16#0078#, 16#0020#, 16#0061#, 16#006E#, 16#0064#, 16#0020#, 16#0079#, 16#0020#, 16#0061#, 16#0078#, 16#0065#, 16#0073#, 16#002E#, others => 16#0000#), others => <>); -- "Rectangle" MS_0029 : aliased Matreshka.Internals.Strings.Shared_String := (Capacity => 15, Unused => 9, Length => 9, Value => (16#0052#, 16#0065#, 16#0063#, 16#0074#, 16#0061#, 16#006E#, 16#0067#, 16#006C#, 16#0065#, others => 16#0000#), others => <>); -- "the focus point coordinates must be between 0 and 1" MS_002A : aliased Matreshka.Internals.Strings.Shared_String := (Capacity => 55, Unused => 51, Length => 51, Value => (16#0074#, 16#0068#, 16#0065#, 16#0020#, 16#0066#, 16#006F#, 16#0063#, 16#0075#, 16#0073#, 16#0020#, 16#0070#, 16#006F#, 16#0069#, 16#006E#, 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#006D#, 16#0075#, 16#0073#, 16#0074#, 16#0020#, 16#0062#, 16#0065#, 16#0020#, 16#0062#, 16#0065#, 16#0074#, 16#0077#, 16#0065#, 16#0065#, 16#006E#, 16#0020#, 16#0030#, 16#0020#, 16#0061#, 16#006E#, 16#0064#, 16#0020#, 16#0031#, others => 16#0000#), others => <>); -- "valid_radius" MS_002B : aliased Matreshka.Internals.Strings.Shared_String := (Capacity => 15, Unused => 12, Length => 12, Value => (16#0076#, 16#0061#, 16#006C#, 16#0069#, 16#0064#, 16#005F#, 16#0072#, 16#0061#, 16#0064#, 16#0069#, 16#0075#, 16#0073#, others => 16#0000#), others => <>); -- "A_member_group" MS_002C : aliased Matreshka.Internals.Strings.Shared_String := (Capacity => 15, Unused => 14, Length => 14, Value => (16#0041#, 16#005F#, 16#006D#, 16#0065#, 16#006D#, 16#0062#, 16#0065#, 16#0072#, 16#005F#, 16#0067#, 16#0072#, 16#006F#, 16#0075#, 16#0070#, others => 16#0000#), others => <>); -- "RadialGradient" MS_002D : aliased Matreshka.Internals.Strings.Shared_String := (Capacity => 15, Unused => 14, Length => 14, Value => (16#0052#, 16#0061#, 16#0064#, 16#0069#, 16#0061#, 16#006C#, 16#0047#, 16#0072#, 16#0061#, 16#0064#, 16#0069#, 16#0065#, 16#006E#, 16#0074#, others => 16#0000#), others => <>); -- "the opacity must be between 0 and 1." MS_002E : aliased Matreshka.Internals.Strings.Shared_String := (Capacity => 39, Unused => 36, Length => 36, Value => (16#0074#, 16#0068#, 16#0065#, 16#0020#, 16#006F#, 16#0070#, 16#0061#, 16#0063#, 16#0069#, 16#0074#, 16#0079#, 16#0020#, 16#006D#, 16#0075#, 16#0073#, 16#0074#, 16#0020#, 16#0062#, 16#0065#, 16#0020#, 16#0062#, 16#0065#, 16#0074#, 16#0077#, 16#0065#, 16#0065#, 16#006E#, 16#0020#, 16#0030#, 16#0020#, 16#0061#, 16#006E#, 16#0064#, 16#0020#, 16#0031#, 16#002E#, others => 16#0000#), others => <>); -- "the b value of the transform matrix." MS_002F : aliased Matreshka.Internals.Strings.Shared_String := (Capacity => 39, Unused => 36, Length => 36, Value => (16#0074#, 16#0068#, 16#0065#, 16#0020#, 16#0062#, 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#0074#, 16#0072#, 16#0061#, 16#006E#, 16#0073#, 16#0066#, 16#006F#, 16#0072#, 16#006D#, 16#0020#, 16#006D#, 16#0061#, 16#0074#, 16#0072#, 16#0069#, 16#0078#, 16#002E#, others => 16#0000#), others => <>); -- "a list of real numbers specifying a pattern of alternating dash and gap lengths used in stroking the outline of a graphical element with the first one specifying a dash length. The size of the list is expected to be even. If the list is empty, the stroke is drawn solid. The default is empty list." MS_0030 : aliased Matreshka.Internals.Strings.Shared_String := (Capacity => 311, Unused => 297, Length => 297, Value => (16#0061#, 16#0020#, 16#006C#, 16#0069#, 16#0073#, 16#0074#, 16#0020#, 16#006F#, 16#0066#, 16#0020#, 16#0072#, 16#0065#, 16#0061#, 16#006C#, 16#0020#, 16#006E#, 16#0075#, 16#006D#, 16#0062#, 16#0065#, 16#0072#, 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#0061#, 16#0020#, 16#0070#, 16#0061#, 16#0074#, 16#0074#, 16#0065#, 16#0072#, 16#006E#, 16#0020#, 16#006F#, 16#0066#, 16#0020#, 16#0061#, 16#006C#, 16#0074#, 16#0065#, 16#0072#, 16#006E#, 16#0061#, 16#0074#, 16#0069#, 16#006E#, 16#0067#, 16#0020#, 16#0064#, 16#0061#, 16#0073#, 16#0068#, 16#0020#, 16#0061#, 16#006E#, 16#0064#, 16#0020#, 16#0067#, 16#0061#, 16#0070#, 16#0020#, 16#006C#, 16#0065#, 16#006E#, 16#0067#, 16#0074#, 16#0068#, 16#0073#, 16#0020#, 16#0075#, 16#0073#, 16#0065#, 16#0064#, 16#0020#, 16#0069#, 16#006E#, 16#0020#, 16#0073#, 16#0074#, 16#0072#, 16#006F#, 16#006B#, 16#0069#, 16#006E#, 16#0067#, 16#0020#, 16#0074#, 16#0068#, 16#0065#, 16#0020#, 16#006F#, 16#0075#, 16#0074#, 16#006C#, 16#0069#, 16#006E#, 16#0065#, 16#0020#, 16#006F#, 16#0066#, 16#0020#, 16#0061#, 16#0020#, 16#0067#, 16#0072#, 16#0061#, 16#0070#, 16#0068#, 16#0069#, 16#0063#, 16#0061#, 16#006C#, 16#0020#, 16#0065#, 16#006C#, 16#0065#, 16#006D#, 16#0065#, 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#0066#, 16#0069#, 16#0072#, 16#0073#, 16#0074#, 16#0020#, 16#006F#, 16#006E#, 16#0065#, 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#0061#, 16#0020#, 16#0064#, 16#0061#, 16#0073#, 16#0068#, 16#0020#, 16#006C#, 16#0065#, 16#006E#, 16#0067#, 16#0074#, 16#0068#, 16#002E#, 16#0020#, 16#0054#, 16#0068#, 16#0065#, 16#0020#, 16#0073#, 16#0069#, 16#007A#, 16#0065#, 16#0020#, 16#006F#, 16#0066#, 16#0020#, 16#0074#, 16#0068#, 16#0065#, 16#0020#, 16#006C#, 16#0069#, 16#0073#, 16#0074#, 16#0020#, 16#0069#, 16#0073#, 16#0020#, 16#0065#, 16#0078#, 16#0070#, 16#0065#, 16#0063#, 16#0074#, 16#0065#, 16#0064#, 16#0020#, 16#0074#, 16#006F#, 16#0020#, 16#0062#, 16#0065#, 16#0020#, 16#0065#, 16#0076#, 16#0065#, 16#006E#, 16#002E#, 16#0020#, 16#0049#, 16#0066#, 16#0020#, 16#0074#, 16#0068#, 16#0065#, 16#0020#, 16#006C#, 16#0069#, 16#0073#, 16#0074#, 16#0020#, 16#0069#, 16#0073#, 16#0020#, 16#0065#, 16#006D#, 16#0070#, 16#0074#, 16#0079#, 16#002C#, 16#0020#, 16#0074#, 16#0068#, 16#0065#, 16#0020#, 16#0073#, 16#0074#, 16#0072#, 16#006F#, 16#006B#, 16#0065#, 16#0020#, 16#0069#, 16#0073#, 16#0020#, 16#0064#, 16#0072#, 16#0061#, 16#0077#, 16#006E#, 16#0020#, 16#0073#, 16#006F#, 16#006C#, 16#0069#, 16#0064#, 16#002E#, 16#0020#, 16#0054#, 16#0068#, 16#0065#, 16#0020#, 16#0064#, 16#0065#, 16#0066#, 16#0061#, 16#0075#, 16#006C#, 16#0074#, 16#0020#, 16#0069#, 16#0073#, 16#0020#, 16#0065#, 16#006D#, 16#0070#, 16#0074#, 16#0079#, 16#0020#, 16#006C#, 16#0069#, 16#0073#, 16#0074#, 16#002E#, others => 16#0000#), others => <>); -- "valid_fill_opacity" MS_0031 : aliased Matreshka.Internals.Strings.Shared_String := (Capacity => 23, Unused => 18, Length => 18, Value => (16#0076#, 16#0061#, 16#006C#, 16#0069#, 16#0064#, 16#005F#, 16#0066#, 16#0069#, 16#006C#, 16#006C#, 16#005F#, 16#006F#, 16#0070#, 16#0061#, 16#0063#, 16#0069#, 16#0074#, 16#0079#, others => 16#0000#), others => <>); -- "a real number representing the angle (in degrees) of skew along the y-axis. Both positive (clock-wise) and negative (counter-clock-wise) values are allowed." MS_0032 : aliased Matreshka.Internals.Strings.Shared_String := (Capacity => 167, Unused => 156, Length => 156, Value => (16#0061#, 16#0020#, 16#0072#, 16#0065#, 16#0061#, 16#006C#, 16#0020#, 16#006E#, 16#0075#, 16#006D#, 16#0062#, 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#0069#, 16#006E#, 16#0067#, 16#0020#, 16#0074#, 16#0068#, 16#0065#, 16#0020#, 16#0061#, 16#006E#, 16#0067#, 16#006C#, 16#0065#, 16#0020#, 16#0028#, 16#0069#, 16#006E#, 16#0020#, 16#0064#, 16#0065#, 16#0067#, 16#0072#, 16#0065#, 16#0065#, 16#0073#, 16#0029#, 16#0020#, 16#006F#, 16#0066#, 16#0020#, 16#0073#, 16#006B#, 16#0065#, 16#0077#, 16#0020#, 16#0061#, 16#006C#, 16#006F#, 16#006E#, 16#0067#, 16#0020#, 16#0074#, 16#0068#, 16#0065#, 16#0020#, 16#0079#, 16#002D#, 16#0061#, 16#0078#, 16#0069#, 16#0073#, 16#002E#, 16#0020#, 16#0042#, 16#006F#, 16#0074#, 16#0068#, 16#0020#, 16#0070#, 16#006F#, 16#0073#, 16#0069#, 16#0074#, 16#0069#, 16#0076#, 16#0065#, 16#0020#, 16#0028#, 16#0063#, 16#006C#, 16#006F#, 16#0063#, 16#006B#, 16#002D#, 16#0077#, 16#0069#, 16#0073#, 16#0065#, 16#0029#, 16#0020#, 16#0061#, 16#006E#, 16#0064#, 16#0020#, 16#006E#, 16#0065#, 16#0067#, 16#0061#, 16#0074#, 16#0069#, 16#0076#, 16#0065#, 16#0020#, 16#0028#, 16#0063#, 16#006F#, 16#0075#, 16#006E#, 16#0074#, 16#0065#, 16#0072#, 16#002D#, 16#0063#, 16#006C#, 16#006F#, 16#0063#, 16#006B#, 16#002D#, 16#0077#, 16#0069#, 16#0073#, 16#0065#, 16#0029#, 16#0020#, 16#0076#, 16#0061#, 16#006C#, 16#0075#, 16#0065#, 16#0073#, 16#0020#, 16#0061#, 16#0072#, 16#0065#, 16#0020#, 16#0061#, 16#006C#, 16#006C#, 16#006F#, 16#0077#, 16#0065#, 16#0064#, 16#002E#, others => 16#0000#), others => <>); -- "Line" MS_0033 : aliased Matreshka.Internals.Strings.Shared_String := (Capacity => 7, Unused => 4, Length => 4, Value => (16#004C#, 16#0069#, 16#006E#, 16#0065#, others => 16#0000#), others => <>); -- "strokeOpacity" MS_0034 : aliased Matreshka.Internals.Strings.Shared_String := (Capacity => 15, Unused => 13, Length => 13, Value => (16#0073#, 16#0074#, 16#0072#, 16#006F#, 16#006B#, 16#0065#, 16#004F#, 16#0070#, 16#0061#, 16#0063#, 16#0069#, 16#0074#, 16#0079#, others => 16#0000#), others => <>); -- "valid_stroke_width" MS_0035 : aliased Matreshka.Internals.Strings.Shared_String := (Capacity => 23, Unused => 18, Length => 18, Value => (16#0076#, 16#0061#, 16#006C#, 16#0069#, 16#0064#, 16#005F#, 16#0073#, 16#0074#, 16#0072#, 16#006F#, 16#006B#, 16#0065#, 16#005F#, 16#0077#, 16#0069#, 16#0064#, 16#0074#, 16#0068#, others => 16#0000#), others => <>); -- "radii" MS_0036 : aliased Matreshka.Internals.Strings.Shared_String := (Capacity => 7, Unused => 5, Length => 5, Value => (16#0072#, 16#0061#, 16#0064#, 16#0069#, 16#0069#, others => 16#0000#), others => <>); -- "1" MS_0037 : aliased Matreshka.Internals.Strings.Shared_String := (Capacity => 7, Unused => 1, Length => 1, Value => (16#0031#, others => 16#0000#), others => <>); -- "a list of shared styles for this graphical element." MS_0038 : aliased Matreshka.Internals.Strings.Shared_String := (Capacity => 55, Unused => 51, Length => 51, Value => (16#0061#, 16#0020#, 16#006C#, 16#0069#, 16#0073#, 16#0074#, 16#0020#, 16#006F#, 16#0066#, 16#0020#, 16#0073#, 16#0068#, 16#0061#, 16#0072#, 16#0065#, 16#0064#, 16#0020#, 16#0073#, 16#0074#, 16#0079#, 16#006C#, 16#0065#, 16#0073#, 16#0020#, 16#0066#, 16#006F#, 16#0072#, 16#0020#, 16#0074#, 16#0068#, 16#0069#, 16#0073#, 16#0020#, 16#0067#, 16#0072#, 16#0061#, 16#0070#, 16#0068#, 16#0069#, 16#0063#, 16#0061#, 16#006C#, 16#0020#, 16#0065#, 16#006C#, 16#0065#, 16#006D#, 16#0065#, 16#006E#, 16#0074#, 16#002E#, others => 16#0000#), others => <>); -- "cornerRadius" MS_0039 : aliased Matreshka.Internals.Strings.Shared_String := (Capacity => 15, Unused => 12, Length => 12, Value => (16#0063#, 16#006F#, 16#0072#, 16#006E#, 16#0065#, 16#0072#, 16#0052#, 16#0061#, 16#0064#, 16#0069#, 16#0075#, 16#0073#, others => 16#0000#), others => <>); -- "clipPath" MS_003A : aliased Matreshka.Internals.Strings.Shared_String := (Capacity => 15, Unused => 8, Length => 8, Value => (16#0063#, 16#006C#, 16#0069#, 16#0070#, 16#0050#, 16#0061#, 16#0074#, 16#0068#, others => 16#0000#), others => <>); -- "Text" MS_003B : aliased Matreshka.Internals.Strings.Shared_String := (Capacity => 7, Unused => 4, Length => 4, Value => (16#0054#, 16#0065#, 16#0078#, 16#0074#, others => 16#0000#), others => <>); -- "A_fill_style" MS_003C : aliased Matreshka.Internals.Strings.Shared_String := (Capacity => 15, Unused => 12, Length => 12, Value => (16#0041#, 16#005F#, 16#0066#, 16#0069#, 16#006C#, 16#006C#, 16#005F#, 16#0073#, 16#0074#, 16#0079#, 16#006C#, 16#0065#, others => 16#0000#), others => <>); -- "a list of 3 or more points making up the polygon." MS_003D : aliased Matreshka.Internals.Strings.Shared_String := (Capacity => 55, Unused => 49, Length => 49, Value => (16#0061#, 16#0020#, 16#006C#, 16#0069#, 16#0073#, 16#0074#, 16#0020#, 16#006F#, 16#0066#, 16#0020#, 16#0033#, 16#0020#, 16#006F#, 16#0072#, 16#0020#, 16#006D#, 16#006F#, 16#0072#, 16#0065#, 16#0020#, 16#0070#, 16#006F#, 16#0069#, 16#006E#, 16#0074#, 16#0073#, 16#0020#, 16#006D#, 16#0061#, 16#006B#, 16#0069#, 16#006E#, 16#0067#, 16#0020#, 16#0075#, 16#0070#, 16#0020#, 16#0074#, 16#0068#, 16#0065#, 16#0020#, 16#0070#, 16#006F#, 16#006C#, 16#0079#, 16#0067#, 16#006F#, 16#006E#, 16#002E#, others => 16#0000#), others => <>); -- "a point to draw a straight line to from the current point in the coordinate system." MS_003E : aliased Matreshka.Internals.Strings.Shared_String := (Capacity => 87, Unused => 83, Length => 83, Value => (16#0061#, 16#0020#, 16#0070#, 16#006F#, 16#0069#, 16#006E#, 16#0074#, 16#0020#, 16#0074#, 16#006F#, 16#0020#, 16#0064#, 16#0072#, 16#0061#, 16#0077#, 16#0020#, 16#0061#, 16#0020#, 16#0073#, 16#0074#, 16#0072#, 16#0061#, 16#0069#, 16#0067#, 16#0068#, 16#0074#, 16#0020#, 16#006C#, 16#0069#, 16#006E#, 16#0065#, 16#0020#, 16#0074#, 16#006F#, 16#0020#, 16#0066#, 16#0072#, 16#006F#, 16#006D#, 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#0070#, 16#006F#, 16#0069#, 16#006E#, 16#0074#, 16#0020#, 16#0069#, 16#006E#, 16#0020#, 16#0074#, 16#0068#, 16#0065#, 16#0020#, 16#0063#, 16#006F#, 16#006F#, 16#0072#, 16#0064#, 16#0069#, 16#006E#, 16#0061#, 16#0074#, 16#0065#, 16#0020#, 16#0073#, 16#0079#, 16#0073#, 16#0074#, 16#0065#, 16#006D#, 16#002E#, others => 16#0000#), others => <>); -- "a real number (>=0 and >=1) representing a ratio of the graphical element's width that is the y center point of the gradient." MS_003F : aliased Matreshka.Internals.Strings.Shared_String := (Capacity => 135, Unused => 125, Length => 125, Value => (16#0061#, 16#0020#, 16#0072#, 16#0065#, 16#0061#, 16#006C#, 16#0020#, 16#006E#, 16#0075#, 16#006D#, 16#0062#, 16#0065#, 16#0072#, 16#0020#, 16#0028#, 16#003E#, 16#003D#, 16#0030#, 16#0020#, 16#0061#, 16#006E#, 16#0064#, 16#0020#, 16#003E#, 16#003D#, 16#0031#, 16#0029#, 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#0061#, 16#0020#, 16#0072#, 16#0061#, 16#0074#, 16#0069#, 16#006F#, 16#0020#, 16#006F#, 16#0066#, 16#0020#, 16#0074#, 16#0068#, 16#0065#, 16#0020#, 16#0067#, 16#0072#, 16#0061#, 16#0070#, 16#0068#, 16#0069#, 16#0063#, 16#0061#, 16#006C#, 16#0020#, 16#0065#, 16#006C#, 16#0065#, 16#006D#, 16#0065#, 16#006E#, 16#0074#, 16#0027#, 16#0073#, 16#0020#, 16#0077#, 16#0069#, 16#0064#, 16#0074#, 16#0068#, 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#0079#, 16#0020#, 16#0063#, 16#0065#, 16#006E#, 16#0074#, 16#0065#, 16#0072#, 16#0020#, 16#0070#, 16#006F#, 16#0069#, 16#006E#, 16#0074#, 16#0020#, 16#006F#, 16#0066#, 16#0020#, 16#0074#, 16#0068#, 16#0065#, 16#0020#, 16#0067#, 16#0072#, 16#0061#, 16#0064#, 16#0069#, 16#0065#, 16#006E#, 16#0074#, 16#002E#, others => 16#0000#), others => <>); -- "wether to preserve the aspect ratio of the image upon scaling, i.e. the same scale factor for width and height." MS_0040 : aliased Matreshka.Internals.Strings.Shared_String := (Capacity => 119, Unused => 111, Length => 111, Value => (16#0077#, 16#0065#, 16#0074#, 16#0068#, 16#0065#, 16#0072#, 16#0020#, 16#0074#, 16#006F#, 16#0020#, 16#0070#, 16#0072#, 16#0065#, 16#0073#, 16#0065#, 16#0072#, 16#0076#, 16#0065#, 16#0020#, 16#0074#, 16#0068#, 16#0065#, 16#0020#, 16#0061#, 16#0073#, 16#0070#, 16#0065#, 16#0063#, 16#0074#, 16#0020#, 16#0072#, 16#0061#, 16#0074#, 16#0069#, 16#006F#, 16#0020#, 16#006F#, 16#0066#, 16#0020#, 16#0074#, 16#0068#, 16#0065#, 16#0020#, 16#0069#, 16#006D#, 16#0061#, 16#0067#, 16#0065#, 16#0020#, 16#0075#, 16#0070#, 16#006F#, 16#006E#, 16#0020#, 16#0073#, 16#0063#, 16#0061#, 16#006C#, 16#0069#, 16#006E#, 16#0067#, 16#002C#, 16#0020#, 16#0069#, 16#002E#, 16#0065#, 16#002E#, 16#0020#, 16#0074#, 16#0068#, 16#0065#, 16#0020#, 16#0073#, 16#0061#, 16#006D#, 16#0065#, 16#0020#, 16#0073#, 16#0063#, 16#0061#, 16#006C#, 16#0065#, 16#0020#, 16#0066#, 16#0061#, 16#0063#, 16#0074#, 16#006F#, 16#0072#, 16#0020#, 16#0066#, 16#006F#, 16#0072#, 16#0020#, 16#0077#, 16#0069#, 16#0064#, 16#0074#, 16#0068#, 16#0020#, 16#0061#, 16#006E#, 16#0064#, 16#0020#, 16#0068#, 16#0065#, 16#0069#, 16#0067#, 16#0068#, 16#0074#, 16#002E#, others => 16#0000#), others => <>); -- "Skew is a kind of transform that skews (deforms) a graphical element by given angles in the x-y coordinate system." MS_0041 : aliased Matreshka.Internals.Strings.Shared_String := (Capacity => 119, Unused => 114, Length => 114, Value => (16#0053#, 16#006B#, 16#0065#, 16#0077#, 16#0020#, 16#0069#, 16#0073#, 16#0020#, 16#0061#, 16#0020#, 16#006B#, 16#0069#, 16#006E#, 16#0064#, 16#0020#, 16#006F#, 16#0066#, 16#0020#, 16#0074#, 16#0072#, 16#0061#, 16#006E#, 16#0073#, 16#0066#, 16#006F#, 16#0072#, 16#006D#, 16#0020#, 16#0074#, 16#0068#, 16#0061#, 16#0074#, 16#0020#, 16#0073#, 16#006B#, 16#0065#, 16#0077#, 16#0073#, 16#0020#, 16#0028#, 16#0064#, 16#0065#, 16#0066#, 16#006F#, 16#0072#, 16#006D#, 16#0073#, 16#0029#, 16#0020#, 16#0061#, 16#0020#, 16#0067#, 16#0072#, 16#0061#, 16#0070#, 16#0068#, 16#0069#, 16#0063#, 16#0061#, 16#006C#, 16#0020#, 16#0065#, 16#006C#, 16#0065#, 16#006D#, 16#0065#, 16#006E#, 16#0074#, 16#0020#, 16#0062#, 16#0079#, 16#0020#, 16#0067#, 16#0069#, 16#0076#, 16#0065#, 16#006E#, 16#0020#, 16#0061#, 16#006E#, 16#0067#, 16#006C#, 16#0065#, 16#0073#, 16#0020#, 16#0069#, 16#006E#, 16#0020#, 16#0074#, 16#0068#, 16#0065#, 16#0020#, 16#0078#, 16#002D#, 16#0079#, 16#0020#, 16#0063#, 16#006F#, 16#006F#, 16#0072#, 16#0064#, 16#0069#, 16#006E#, 16#0061#, 16#0074#, 16#0065#, 16#0020#, 16#0073#, 16#0079#, 16#0073#, 16#0074#, 16#0065#, 16#006D#, 16#002E#, others => 16#0000#), others => <>); -- "A_marker_canvas" MS_0042 : aliased Matreshka.Internals.Strings.Shared_String := (Capacity => 23, Unused => 15, Length => 15, Value => (16#0041#, 16#005F#, 16#006D#, 16#0061#, 16#0072#, 16#006B#, 16#0065#, 16#0072#, 16#005F#, 16#0063#, 16#0061#, 16#006E#, 16#0076#, 16#0061#, 16#0073#, others => 16#0000#), others => <>); -- "the center point coordinates must be between 0 and 1" MS_0043 : aliased Matreshka.Internals.Strings.Shared_String := (Capacity => 55, Unused => 52, Length => 52, Value => (16#0074#, 16#0068#, 16#0065#, 16#0020#, 16#0063#, 16#0065#, 16#006E#, 16#0074#, 16#0065#, 16#0072#, 16#0020#, 16#0070#, 16#006F#, 16#0069#, 16#006E#, 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#006D#, 16#0075#, 16#0073#, 16#0074#, 16#0020#, 16#0062#, 16#0065#, 16#0020#, 16#0062#, 16#0065#, 16#0074#, 16#0077#, 16#0065#, 16#0065#, 16#006E#, 16#0020#, 16#0030#, 16#0020#, 16#0061#, 16#006E#, 16#0064#, 16#0020#, 16#0031#, others => 16#0000#), others => <>); -- "fontSize" MS_0044 : aliased Matreshka.Internals.Strings.Shared_String := (Capacity => 15, Unused => 8, Length => 8, Value => (16#0066#, 16#006F#, 16#006E#, 16#0074#, 16#0053#, 16#0069#, 16#007A#, 16#0065#, others => 16#0000#), others => <>); -- "a point in the x-y coordinate system about which the rotation is performed. If the point is not specified, it is assumed to be the origin of the x-y coordinate system." MS_0045 : aliased Matreshka.Internals.Strings.Shared_String := (Capacity => 175, Unused => 167, Length => 167, Value => (16#0061#, 16#0020#, 16#0070#, 16#006F#, 16#0069#, 16#006E#, 16#0074#, 16#0020#, 16#0069#, 16#006E#, 16#0020#, 16#0074#, 16#0068#, 16#0065#, 16#0020#, 16#0078#, 16#002D#, 16#0079#, 16#0020#, 16#0063#, 16#006F#, 16#006F#, 16#0072#, 16#0064#, 16#0069#, 16#006E#, 16#0061#, 16#0074#, 16#0065#, 16#0020#, 16#0073#, 16#0079#, 16#0073#, 16#0074#, 16#0065#, 16#006D#, 16#0020#, 16#0061#, 16#0062#, 16#006F#, 16#0075#, 16#0074#, 16#0020#, 16#0077#, 16#0068#, 16#0069#, 16#0063#, 16#0068#, 16#0020#, 16#0074#, 16#0068#, 16#0065#, 16#0020#, 16#0072#, 16#006F#, 16#0074#, 16#0061#, 16#0074#, 16#0069#, 16#006F#, 16#006E#, 16#0020#, 16#0069#, 16#0073#, 16#0020#, 16#0070#, 16#0065#, 16#0072#, 16#0066#, 16#006F#, 16#0072#, 16#006D#, 16#0065#, 16#0064#, 16#002E#, 16#0020#, 16#0049#, 16#0066#, 16#0020#, 16#0074#, 16#0068#, 16#0065#, 16#0020#, 16#0070#, 16#006F#, 16#0069#, 16#006E#, 16#0074#, 16#0020#, 16#0069#, 16#0073#, 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#002C#, 16#0020#, 16#0069#, 16#0074#, 16#0020#, 16#0069#, 16#0073#, 16#0020#, 16#0061#, 16#0073#, 16#0073#, 16#0075#, 16#006D#, 16#0065#, 16#0064#, 16#0020#, 16#0074#, 16#006F#, 16#0020#, 16#0062#, 16#0065#, 16#0020#, 16#0074#, 16#0068#, 16#0065#, 16#0020#, 16#006F#, 16#0072#, 16#0069#, 16#0067#, 16#0069#, 16#006E#, 16#0020#, 16#006F#, 16#0066#, 16#0020#, 16#0074#, 16#0068#, 16#0065#, 16#0020#, 16#0078#, 16#002D#, 16#0079#, 16#0020#, 16#0063#, 16#006F#, 16#006F#, 16#0072#, 16#0064#, 16#0069#, 16#006E#, 16#0061#, 16#0074#, 16#0065#, 16#0020#, 16#0073#, 16#0079#, 16#0073#, 16#0074#, 16#0065#, 16#006D#, 16#002E#, others => 16#0000#), others => <>); -- "Image" MS_0046 : aliased Matreshka.Internals.Strings.Shared_String := (Capacity => 7, Unused => 5, Length => 5, Value => (16#0049#, 16#006D#, 16#0061#, 16#0067#, 16#0065#, others => 16#0000#), others => <>); -- "org.omg.xmi.nsURI" MS_0047 : aliased Matreshka.Internals.Strings.Shared_String := (Capacity => 23, Unused => 17, Length => 17, Value => (16#006F#, 16#0072#, 16#0067#, 16#002E#, 16#006F#, 16#006D#, 16#0067#, 16#002E#, 16#0078#, 16#006D#, 16#0069#, 16#002E#, 16#006E#, 16#0073#, 16#0055#, 16#0052#, 16#0049#, others => 16#0000#), others => <>); -- "ClipPath" MS_0048 : aliased Matreshka.Internals.Strings.Shared_String := (Capacity => 15, Unused => 8, Length => 8, Value => (16#0043#, 16#006C#, 16#0069#, 16#0070#, 16#0050#, 16#0061#, 16#0074#, 16#0068#, others => 16#0000#), others => <>); -- "a color that is used to paint the background of the canvas itself. A backgroundColor value is exclusive with a backgroundFill value. If both are specified, the backgroundFill value is used. If none is specified, no fill is applied (i.e. the canvas becomes see-through)." MS_0049 : aliased Matreshka.Internals.Strings.Shared_String := (Capacity => 279, Unused => 269, Length => 269, Value => (16#0061#, 16#0020#, 16#0063#, 16#006F#, 16#006C#, 16#006F#, 16#0072#, 16#0020#, 16#0074#, 16#0068#, 16#0061#, 16#0074#, 16#0020#, 16#0069#, 16#0073#, 16#0020#, 16#0075#, 16#0073#, 16#0065#, 16#0064#, 16#0020#, 16#0074#, 16#006F#, 16#0020#, 16#0070#, 16#0061#, 16#0069#, 16#006E#, 16#0074#, 16#0020#, 16#0074#, 16#0068#, 16#0065#, 16#0020#, 16#0062#, 16#0061#, 16#0063#, 16#006B#, 16#0067#, 16#0072#, 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#0063#, 16#0061#, 16#006E#, 16#0076#, 16#0061#, 16#0073#, 16#0020#, 16#0069#, 16#0074#, 16#0073#, 16#0065#, 16#006C#, 16#0066#, 16#002E#, 16#0020#, 16#0041#, 16#0020#, 16#0062#, 16#0061#, 16#0063#, 16#006B#, 16#0067#, 16#0072#, 16#006F#, 16#0075#, 16#006E#, 16#0064#, 16#0043#, 16#006F#, 16#006C#, 16#006F#, 16#0072#, 16#0020#, 16#0076#, 16#0061#, 16#006C#, 16#0075#, 16#0065#, 16#0020#, 16#0069#, 16#0073#, 16#0020#, 16#0065#, 16#0078#, 16#0063#, 16#006C#, 16#0075#, 16#0073#, 16#0069#, 16#0076#, 16#0065#, 16#0020#, 16#0077#, 16#0069#, 16#0074#, 16#0068#, 16#0020#, 16#0061#, 16#0020#, 16#0062#, 16#0061#, 16#0063#, 16#006B#, 16#0067#, 16#0072#, 16#006F#, 16#0075#, 16#006E#, 16#0064#, 16#0046#, 16#0069#, 16#006C#, 16#006C#, 16#0020#, 16#0076#, 16#0061#, 16#006C#, 16#0075#, 16#0065#, 16#002E#, 16#0020#, 16#0049#, 16#0066#, 16#0020#, 16#0062#, 16#006F#, 16#0074#, 16#0068#, 16#0020#, 16#0061#, 16#0072#, 16#0065#, 16#0020#, 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#0020#, 16#0062#, 16#0061#, 16#0063#, 16#006B#, 16#0067#, 16#0072#, 16#006F#, 16#0075#, 16#006E#, 16#0064#, 16#0046#, 16#0069#, 16#006C#, 16#006C#, 16#0020#, 16#0076#, 16#0061#, 16#006C#, 16#0075#, 16#0065#, 16#0020#, 16#0069#, 16#0073#, 16#0020#, 16#0075#, 16#0073#, 16#0065#, 16#0064#, 16#002E#, 16#0020#, 16#0049#, 16#0066#, 16#0020#, 16#006E#, 16#006F#, 16#006E#, 16#0065#, 16#0020#, 16#0069#, 16#0073#, 16#0020#, 16#0073#, 16#0070#, 16#0065#, 16#0063#, 16#0069#, 16#0066#, 16#0069#, 16#0065#, 16#0064#, 16#002C#, 16#0020#, 16#006E#, 16#006F#, 16#0020#, 16#0066#, 16#0069#, 16#006C#, 16#006C#, 16#0020#, 16#0069#, 16#0073#, 16#0020#, 16#0061#, 16#0070#, 16#0070#, 16#006C#, 16#0069#, 16#0065#, 16#0064#, 16#0020#, 16#0028#, 16#0069#, 16#002E#, 16#0065#, 16#002E#, 16#0020#, 16#0074#, 16#0068#, 16#0065#, 16#0020#, 16#0063#, 16#0061#, 16#006E#, 16#0076#, 16#0061#, 16#0073#, 16#0020#, 16#0062#, 16#0065#, 16#0063#, 16#006F#, 16#006D#, 16#0065#, 16#0073#, 16#0020#, 16#0073#, 16#0065#, 16#0065#, 16#002D#, 16#0074#, 16#0068#, 16#0072#, 16#006F#, 16#0075#, 16#0067#, 16#0068#, 16#0029#, 16#002E#, others => 16#0000#), others => <>); -- "Pattern is a kind of fill that paints a graphical element (a tile) repeatedly at fixed intervals in x and y axes to cover the areas to be filled." MS_004A : aliased Matreshka.Internals.Strings.Shared_String := (Capacity => 151, Unused => 145, Length => 145, Value => (16#0050#, 16#0061#, 16#0074#, 16#0074#, 16#0065#, 16#0072#, 16#006E#, 16#0020#, 16#0069#, 16#0073#, 16#0020#, 16#0061#, 16#0020#, 16#006B#, 16#0069#, 16#006E#, 16#0064#, 16#0020#, 16#006F#, 16#0066#, 16#0020#, 16#0066#, 16#0069#, 16#006C#, 16#006C#, 16#0020#, 16#0074#, 16#0068#, 16#0061#, 16#0074#, 16#0020#, 16#0070#, 16#0061#, 16#0069#, 16#006E#, 16#0074#, 16#0073#, 16#0020#, 16#0061#, 16#0020#, 16#0067#, 16#0072#, 16#0061#, 16#0070#, 16#0068#, 16#0069#, 16#0063#, 16#0061#, 16#006C#, 16#0020#, 16#0065#, 16#006C#, 16#0065#, 16#006D#, 16#0065#, 16#006E#, 16#0074#, 16#0020#, 16#0028#, 16#0061#, 16#0020#, 16#0074#, 16#0069#, 16#006C#, 16#0065#, 16#0029#, 16#0020#, 16#0072#, 16#0065#, 16#0070#, 16#0065#, 16#0061#, 16#0074#, 16#0065#, 16#0064#, 16#006C#, 16#0079#, 16#0020#, 16#0061#, 16#0074#, 16#0020#, 16#0066#, 16#0069#, 16#0078#, 16#0065#, 16#0064#, 16#0020#, 16#0069#, 16#006E#, 16#0074#, 16#0065#, 16#0072#, 16#0076#, 16#0061#, 16#006C#, 16#0073#, 16#0020#, 16#0069#, 16#006E#, 16#0020#, 16#0078#, 16#0020#, 16#0061#, 16#006E#, 16#0064#, 16#0020#, 16#0079#, 16#0020#, 16#0061#, 16#0078#, 16#0065#, 16#0073#, 16#0020#, 16#0074#, 16#006F#, 16#0020#, 16#0063#, 16#006F#, 16#0076#, 16#0065#, 16#0072#, 16#0020#, 16#0074#, 16#0068#, 16#0065#, 16#0020#, 16#0061#, 16#0072#, 16#0065#, 16#0061#, 16#0073#, 16#0020#, 16#0074#, 16#006F#, 16#0020#, 16#0062#, 16#0065#, 16#0020#, 16#0066#, 16#0069#, 16#006C#, 16#006C#, 16#0065#, 16#0064#, 16#002E#, others => 16#0000#), others => <>); -- "a point to draw a quadratic bézier curve to from the current point in the coordinate system." MS_004B : aliased Matreshka.Internals.Strings.Shared_String := (Capacity => 95, Unused => 92, Length => 92, Value => (16#0061#, 16#0020#, 16#0070#, 16#006F#, 16#0069#, 16#006E#, 16#0074#, 16#0020#, 16#0074#, 16#006F#, 16#0020#, 16#0064#, 16#0072#, 16#0061#, 16#0077#, 16#0020#, 16#0061#, 16#0020#, 16#0071#, 16#0075#, 16#0061#, 16#0064#, 16#0072#, 16#0061#, 16#0074#, 16#0069#, 16#0063#, 16#0020#, 16#0062#, 16#00E9#, 16#007A#, 16#0069#, 16#0065#, 16#0072#, 16#0020#, 16#0063#, 16#0075#, 16#0072#, 16#0076#, 16#0065#, 16#0020#, 16#0074#, 16#006F#, 16#0020#, 16#0066#, 16#0072#, 16#006F#, 16#006D#, 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#0070#, 16#006F#, 16#0069#, 16#006E#, 16#0074#, 16#0020#, 16#0069#, 16#006E#, 16#0020#, 16#0074#, 16#0068#, 16#0065#, 16#0020#, 16#0063#, 16#006F#, 16#006F#, 16#0072#, 16#0064#, 16#0069#, 16#006E#, 16#0061#, 16#0074#, 16#0065#, 16#0020#, 16#0073#, 16#0079#, 16#0073#, 16#0074#, 16#0065#, 16#006D#, 16#002E#, others => 16#0000#), others => <>); -- "markedElement" MS_004C : aliased Matreshka.Internals.Strings.Shared_String := (Capacity => 15, Unused => 13, Length => 13, Value => (16#006D#, 16#0061#, 16#0072#, 16#006B#, 16#0065#, 16#0064#, 16#0045#, 16#006C#, 16#0065#, 16#006D#, 16#0065#, 16#006E#, 16#0074#, others => 16#0000#), others => <>); -- "a real number representing the angle (in degrees) of rotation. Both positive (clock-wise) and negative (counter-clock-wise) values are allowed." MS_004D : aliased Matreshka.Internals.Strings.Shared_String := (Capacity => 151, Unused => 143, Length => 143, Value => (16#0061#, 16#0020#, 16#0072#, 16#0065#, 16#0061#, 16#006C#, 16#0020#, 16#006E#, 16#0075#, 16#006D#, 16#0062#, 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#0069#, 16#006E#, 16#0067#, 16#0020#, 16#0074#, 16#0068#, 16#0065#, 16#0020#, 16#0061#, 16#006E#, 16#0067#, 16#006C#, 16#0065#, 16#0020#, 16#0028#, 16#0069#, 16#006E#, 16#0020#, 16#0064#, 16#0065#, 16#0067#, 16#0072#, 16#0065#, 16#0065#, 16#0073#, 16#0029#, 16#0020#, 16#006F#, 16#0066#, 16#0020#, 16#0072#, 16#006F#, 16#0074#, 16#0061#, 16#0074#, 16#0069#, 16#006F#, 16#006E#, 16#002E#, 16#0020#, 16#0042#, 16#006F#, 16#0074#, 16#0068#, 16#0020#, 16#0070#, 16#006F#, 16#0073#, 16#0069#, 16#0074#, 16#0069#, 16#0076#, 16#0065#, 16#0020#, 16#0028#, 16#0063#, 16#006C#, 16#006F#, 16#0063#, 16#006B#, 16#002D#, 16#0077#, 16#0069#, 16#0073#, 16#0065#, 16#0029#, 16#0020#, 16#0061#, 16#006E#, 16#0064#, 16#0020#, 16#006E#, 16#0065#, 16#0067#, 16#0061#, 16#0074#, 16#0069#, 16#0076#, 16#0065#, 16#0020#, 16#0028#, 16#0063#, 16#006F#, 16#0075#, 16#006E#, 16#0074#, 16#0065#, 16#0072#, 16#002D#, 16#0063#, 16#006C#, 16#006F#, 16#0063#, 16#006B#, 16#002D#, 16#0077#, 16#0069#, 16#0073#, 16#0065#, 16#0029#, 16#0020#, 16#0076#, 16#0061#, 16#006C#, 16#0075#, 16#0065#, 16#0073#, 16#0020#, 16#0061#, 16#0072#, 16#0065#, 16#0020#, 16#0061#, 16#006C#, 16#006C#, 16#006F#, 16#0077#, 16#0065#, 16#0064#, 16#002E#, others => 16#0000#), others => <>); -- "A_sharedStyle_styledElement" MS_004E : aliased Matreshka.Internals.Strings.Shared_String := (Capacity => 31, Unused => 27, Length => 27, Value => (16#0041#, 16#005F#, 16#0073#, 16#0068#, 16#0061#, 16#0072#, 16#0065#, 16#0064#, 16#0053#, 16#0074#, 16#0079#, 16#006C#, 16#0065#, 16#005F#, 16#0073#, 16#0074#, 16#0079#, 16#006C#, 16#0065#, 16#0064#, 16#0045#, 16#006C#, 16#0065#, 16#006D#, 16#0065#, 16#006E#, 16#0074#, others => 16#0000#), others => <>); -- "the control point of the quadratic bézier curve." MS_004F : aliased Matreshka.Internals.Strings.Shared_String := (Capacity => 55, Unused => 48, Length => 48, Value => (16#0074#, 16#0068#, 16#0065#, 16#0020#, 16#0063#, 16#006F#, 16#006E#, 16#0074#, 16#0072#, 16#006F#, 16#006C#, 16#0020#, 16#0070#, 16#006F#, 16#0069#, 16#006E#, 16#0074#, 16#0020#, 16#006F#, 16#0066#, 16#0020#, 16#0074#, 16#0068#, 16#0065#, 16#0020#, 16#0071#, 16#0075#, 16#0061#, 16#0064#, 16#0072#, 16#0061#, 16#0074#, 16#0069#, 16#0063#, 16#0020#, 16#0062#, 16#00E9#, 16#007A#, 16#0069#, 16#0065#, 16#0072#, 16#0020#, 16#0063#, 16#0075#, 16#0072#, 16#0076#, 16#0065#, 16#002E#, others => 16#0000#), others => <>); -- "a list of zero or more transforms to apply to this fill." MS_0050 : aliased Matreshka.Internals.Strings.Shared_String := (Capacity => 63, Unused => 56, Length => 56, Value => (16#0061#, 16#0020#, 16#006C#, 16#0069#, 16#0073#, 16#0074#, 16#0020#, 16#006F#, 16#0066#, 16#0020#, 16#007A#, 16#0065#, 16#0072#, 16#006F#, 16#0020#, 16#006F#, 16#0072#, 16#0020#, 16#006D#, 16#006F#, 16#0072#, 16#0065#, 16#0020#, 16#0074#, 16#0072#, 16#0061#, 16#006E#, 16#0073#, 16#0066#, 16#006F#, 16#0072#, 16#006D#, 16#0073#, 16#0020#, 16#0074#, 16#006F#, 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#0069#, 16#006C#, 16#006C#, 16#002E#, others => 16#0000#), others => <>); -- "a real number (>=0 and<=1) representing the opacity of the color at the stop. A value of 0 means totally transparent, while a value of 1 means totally opaque." MS_0051 : aliased Matreshka.Internals.Strings.Shared_String := (Capacity => 167, Unused => 158, Length => 158, Value => (16#0061#, 16#0020#, 16#0072#, 16#0065#, 16#0061#, 16#006C#, 16#0020#, 16#006E#, 16#0075#, 16#006D#, 16#0062#, 16#0065#, 16#0072#, 16#0020#, 16#0028#, 16#003E#, 16#003D#, 16#0030#, 16#0020#, 16#0061#, 16#006E#, 16#0064#, 16#003C#, 16#003D#, 16#0031#, 16#0029#, 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#006F#, 16#0070#, 16#0061#, 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#0063#, 16#006F#, 16#006C#, 16#006F#, 16#0072#, 16#0020#, 16#0061#, 16#0074#, 16#0020#, 16#0074#, 16#0068#, 16#0065#, 16#0020#, 16#0073#, 16#0074#, 16#006F#, 16#0070#, 16#002E#, 16#0020#, 16#0041#, 16#0020#, 16#0076#, 16#0061#, 16#006C#, 16#0075#, 16#0065#, 16#0020#, 16#006F#, 16#0066#, 16#0020#, 16#0030#, 16#0020#, 16#006D#, 16#0065#, 16#0061#, 16#006E#, 16#0073#, 16#0020#, 16#0074#, 16#006F#, 16#0074#, 16#0061#, 16#006C#, 16#006C#, 16#0079#, 16#0020#, 16#0074#, 16#0072#, 16#0061#, 16#006E#, 16#0073#, 16#0070#, 16#0061#, 16#0072#, 16#0065#, 16#006E#, 16#0074#, 16#002C#, 16#0020#, 16#0077#, 16#0068#, 16#0069#, 16#006C#, 16#0065#, 16#0020#, 16#0061#, 16#0020#, 16#0076#, 16#0061#, 16#006C#, 16#0075#, 16#0065#, 16#0020#, 16#006F#, 16#0066#, 16#0020#, 16#0031#, 16#0020#, 16#006D#, 16#0065#, 16#0061#, 16#006E#, 16#0073#, 16#0020#, 16#0074#, 16#006F#, 16#0074#, 16#0061#, 16#006C#, 16#006C#, 16#0079#, 16#0020#, 16#006F#, 16#0070#, 16#0061#, 16#0071#, 16#0075#, 16#0065#, 16#002E#, others => 16#0000#), others => <>); -- "isLargeArc" MS_0052 : aliased Matreshka.Internals.Strings.Shared_String := (Capacity => 15, Unused => 10, Length => 10, Value => (16#0069#, 16#0073#, 16#004C#, 16#0061#, 16#0072#, 16#0067#, 16#0065#, 16#0041#, 16#0072#, 16#0063#, others => 16#0000#), others => <>); -- "a real number(>=0) representing a scale factor along the y-axis." MS_0053 : aliased Matreshka.Internals.Strings.Shared_String := (Capacity => 71, Unused => 64, Length => 64, Value => (16#0061#, 16#0020#, 16#0072#, 16#0065#, 16#0061#, 16#006C#, 16#0020#, 16#006E#, 16#0075#, 16#006D#, 16#0062#, 16#0065#, 16#0072#, 16#0028#, 16#003E#, 16#003D#, 16#0030#, 16#0029#, 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#0061#, 16#0020#, 16#0073#, 16#0063#, 16#0061#, 16#006C#, 16#0065#, 16#0020#, 16#0066#, 16#0061#, 16#0063#, 16#0074#, 16#006F#, 16#0072#, 16#0020#, 16#0061#, 16#006C#, 16#006F#, 16#006E#, 16#0067#, 16#0020#, 16#0074#, 16#0068#, 16#0065#, 16#0020#, 16#0079#, 16#002D#, 16#0061#, 16#0078#, 16#0069#, 16#0073#, 16#002E#, others => 16#0000#), others => <>); -- "MoveTo is a kind of path command that establishes a new current point in the coordinate system." MS_0054 : aliased Matreshka.Internals.Strings.Shared_String := (Capacity => 103, Unused => 95, Length => 95, Value => (16#004D#, 16#006F#, 16#0076#, 16#0065#, 16#0054#, 16#006F#, 16#0020#, 16#0069#, 16#0073#, 16#0020#, 16#0061#, 16#0020#, 16#006B#, 16#0069#, 16#006E#, 16#0064#, 16#0020#, 16#006F#, 16#0066#, 16#0020#, 16#0070#, 16#0061#, 16#0074#, 16#0068#, 16#0020#, 16#0063#, 16#006F#, 16#006D#, 16#006D#, 16#0061#, 16#006E#, 16#0064#, 16#0020#, 16#0074#, 16#0068#, 16#0061#, 16#0074#, 16#0020#, 16#0065#, 16#0073#, 16#0074#, 16#0061#, 16#0062#, 16#006C#, 16#0069#, 16#0073#, 16#0068#, 16#0065#, 16#0073#, 16#0020#, 16#0061#, 16#0020#, 16#006E#, 16#0065#, 16#0077#, 16#0020#, 16#0063#, 16#0075#, 16#0072#, 16#0072#, 16#0065#, 16#006E#, 16#0074#, 16#0020#, 16#0070#, 16#006F#, 16#0069#, 16#006E#, 16#0074#, 16#0020#, 16#0069#, 16#006E#, 16#0020#, 16#0074#, 16#0068#, 16#0065#, 16#0020#, 16#0063#, 16#006F#, 16#006F#, 16#0072#, 16#0064#, 16#0069#, 16#006E#, 16#0061#, 16#0074#, 16#0065#, 16#0020#, 16#0073#, 16#0079#, 16#0073#, 16#0074#, 16#0065#, 16#006D#, 16#002E#, others => 16#0000#), others => <>); -- "A_backgroundFill_canvas" MS_0055 : aliased Matreshka.Internals.Strings.Shared_String := (Capacity => 31, Unused => 23, Length => 23, Value => (16#0041#, 16#005F#, 16#0062#, 16#0061#, 16#0063#, 16#006B#, 16#0067#, 16#0072#, 16#006F#, 16#0075#, 16#006E#, 16#0064#, 16#0046#, 16#0069#, 16#006C#, 16#006C#, 16#005F#, 16#0063#, 16#0061#, 16#006E#, 16#0076#, 16#0061#, 16#0073#, others => 16#0000#), others => <>); -- "localStyle" MS_0056 : aliased Matreshka.Internals.Strings.Shared_String := (Capacity => 15, Unused => 10, Length => 10, Value => (16#006C#, 16#006F#, 16#0063#, 16#0061#, 16#006C#, 16#0053#, 16#0074#, 16#0079#, 16#006C#, 16#0065#, others => 16#0000#), others => <>); -- "all the components of the gradient vector must be between 0 and 1." MS_0057 : aliased Matreshka.Internals.Strings.Shared_String := (Capacity => 71, Unused => 66, Length => 66, Value => (16#0061#, 16#006C#, 16#006C#, 16#0020#, 16#0074#, 16#0068#, 16#0065#, 16#0020#, 16#0063#, 16#006F#, 16#006D#, 16#0070#, 16#006F#, 16#006E#, 16#0065#, 16#006E#, 16#0074#, 16#0073#, 16#0020#, 16#006F#, 16#0066#, 16#0020#, 16#0074#, 16#0068#, 16#0065#, 16#0020#, 16#0067#, 16#0072#, 16#0061#, 16#0064#, 16#0069#, 16#0065#, 16#006E#, 16#0074#, 16#0020#, 16#0076#, 16#0065#, 16#0063#, 16#0074#, 16#006F#, 16#0072#, 16#0020#, 16#006D#, 16#0075#, 16#0073#, 16#0074#, 16#0020#, 16#0062#, 16#0065#, 16#0020#, 16#0062#, 16#0065#, 16#0074#, 16#0077#, 16#0065#, 16#0065#, 16#006E#, 16#0020#, 16#0030#, 16#0020#, 16#0061#, 16#006E#, 16#0064#, 16#0020#, 16#0031#, 16#002E#, others => 16#0000#), others => <>); -- "A set of markers packaged by the canvas and referenced by marked elements in the canvas." MS_0058 : aliased Matreshka.Internals.Strings.Shared_String := (Capacity => 95, Unused => 88, Length => 88, Value => (16#0041#, 16#0020#, 16#0073#, 16#0065#, 16#0074#, 16#0020#, 16#006F#, 16#0066#, 16#0020#, 16#006D#, 16#0061#, 16#0072#, 16#006B#, 16#0065#, 16#0072#, 16#0073#, 16#0020#, 16#0070#, 16#0061#, 16#0063#, 16#006B#, 16#0061#, 16#0067#, 16#0065#, 16#0064#, 16#0020#, 16#0062#, 16#0079#, 16#0020#, 16#0074#, 16#0068#, 16#0065#, 16#0020#, 16#0063#, 16#0061#, 16#006E#, 16#0076#, 16#0061#, 16#0073#, 16#0020#, 16#0061#, 16#006E#, 16#0064#, 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#006D#, 16#0061#, 16#0072#, 16#006B#, 16#0065#, 16#0064#, 16#0020#, 16#0065#, 16#006C#, 16#0065#, 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#0063#, 16#0061#, 16#006E#, 16#0076#, 16#0061#, 16#0073#, 16#002E#, others => 16#0000#), others => <>); -- "MoveTo" MS_0059 : aliased Matreshka.Internals.Strings.Shared_String := (Capacity => 7, Unused => 6, Length => 6, Value => (16#004D#, 16#006F#, 16#0076#, 16#0065#, 16#0054#, 16#006F#, others => 16#0000#), others => <>); -- "the bounds of the pattern that define a private coordinate system for the pattern's tile." MS_005A : aliased Matreshka.Internals.Strings.Shared_String := (Capacity => 95, Unused => 89, Length => 89, Value => (16#0074#, 16#0068#, 16#0065#, 16#0020#, 16#0062#, 16#006F#, 16#0075#, 16#006E#, 16#0064#, 16#0073#, 16#0020#, 16#006F#, 16#0066#, 16#0020#, 16#0074#, 16#0068#, 16#0065#, 16#0020#, 16#0070#, 16#0061#, 16#0074#, 16#0074#, 16#0065#, 16#0072#, 16#006E#, 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#0020#, 16#0061#, 16#0020#, 16#0070#, 16#0072#, 16#0069#, 16#0076#, 16#0061#, 16#0074#, 16#0065#, 16#0020#, 16#0063#, 16#006F#, 16#006F#, 16#0072#, 16#0064#, 16#0069#, 16#006E#, 16#0061#, 16#0074#, 16#0065#, 16#0020#, 16#0073#, 16#0079#, 16#0073#, 16#0074#, 16#0065#, 16#006D#, 16#0020#, 16#0066#, 16#006F#, 16#0072#, 16#0020#, 16#0074#, 16#0068#, 16#0065#, 16#0020#, 16#0070#, 16#0061#, 16#0074#, 16#0074#, 16#0065#, 16#0072#, 16#006E#, 16#0027#, 16#0073#, 16#0020#, 16#0074#, 16#0069#, 16#006C#, 16#0065#, 16#002E#, others => 16#0000#), others => <>); -- "Polygon is a marked element that defines a closed shape consisting of a sequence of connected straight line segments." MS_005B : aliased Matreshka.Internals.Strings.Shared_String := (Capacity => 127, Unused => 117, Length => 117, Value => (16#0050#, 16#006F#, 16#006C#, 16#0079#, 16#0067#, 16#006F#, 16#006E#, 16#0020#, 16#0069#, 16#0073#, 16#0020#, 16#0061#, 16#0020#, 16#006D#, 16#0061#, 16#0072#, 16#006B#, 16#0065#, 16#0064#, 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#0064#, 16#0065#, 16#0066#, 16#0069#, 16#006E#, 16#0065#, 16#0073#, 16#0020#, 16#0061#, 16#0020#, 16#0063#, 16#006C#, 16#006F#, 16#0073#, 16#0065#, 16#0064#, 16#0020#, 16#0073#, 16#0068#, 16#0061#, 16#0070#, 16#0065#, 16#0020#, 16#0063#, 16#006F#, 16#006E#, 16#0073#, 16#0069#, 16#0073#, 16#0074#, 16#0069#, 16#006E#, 16#0067#, 16#0020#, 16#006F#, 16#0066#, 16#0020#, 16#0061#, 16#0020#, 16#0073#, 16#0065#, 16#0071#, 16#0075#, 16#0065#, 16#006E#, 16#0063#, 16#0065#, 16#0020#, 16#006F#, 16#0066#, 16#0020#, 16#0063#, 16#006F#, 16#006E#, 16#006E#, 16#0065#, 16#0063#, 16#0074#, 16#0065#, 16#0064#, 16#0020#, 16#0073#, 16#0074#, 16#0072#, 16#0061#, 16#0069#, 16#0067#, 16#0068#, 16#0074#, 16#0020#, 16#006C#, 16#0069#, 16#006E#, 16#0065#, 16#0020#, 16#0073#, 16#0065#, 16#0067#, 16#006D#, 16#0065#, 16#006E#, 16#0074#, 16#0073#, 16#002E#, others => 16#0000#), others => <>); -- "a real number (>=0 and <=1) representing the opacity of the fill or fillColor used to paint a graphical element. A value of 0 means totally transparent, while a value of 1 means totally opaque. The default is 1." MS_005C : aliased Matreshka.Internals.Strings.Shared_String := (Capacity => 223, Unused => 211, Length => 211, Value => (16#0061#, 16#0020#, 16#0072#, 16#0065#, 16#0061#, 16#006C#, 16#0020#, 16#006E#, 16#0075#, 16#006D#, 16#0062#, 16#0065#, 16#0072#, 16#0020#, 16#0028#, 16#003E#, 16#003D#, 16#0030#, 16#0020#, 16#0061#, 16#006E#, 16#0064#, 16#0020#, 16#003C#, 16#003D#, 16#0031#, 16#0029#, 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#006F#, 16#0070#, 16#0061#, 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#0066#, 16#0069#, 16#006C#, 16#006C#, 16#0020#, 16#006F#, 16#0072#, 16#0020#, 16#0066#, 16#0069#, 16#006C#, 16#006C#, 16#0043#, 16#006F#, 16#006C#, 16#006F#, 16#0072#, 16#0020#, 16#0075#, 16#0073#, 16#0065#, 16#0064#, 16#0020#, 16#0074#, 16#006F#, 16#0020#, 16#0070#, 16#0061#, 16#0069#, 16#006E#, 16#0074#, 16#0020#, 16#0061#, 16#0020#, 16#0067#, 16#0072#, 16#0061#, 16#0070#, 16#0068#, 16#0069#, 16#0063#, 16#0061#, 16#006C#, 16#0020#, 16#0065#, 16#006C#, 16#0065#, 16#006D#, 16#0065#, 16#006E#, 16#0074#, 16#002E#, 16#0020#, 16#0041#, 16#0020#, 16#0076#, 16#0061#, 16#006C#, 16#0075#, 16#0065#, 16#0020#, 16#006F#, 16#0066#, 16#0020#, 16#0030#, 16#0020#, 16#006D#, 16#0065#, 16#0061#, 16#006E#, 16#0073#, 16#0020#, 16#0074#, 16#006F#, 16#0074#, 16#0061#, 16#006C#, 16#006C#, 16#0079#, 16#0020#, 16#0074#, 16#0072#, 16#0061#, 16#006E#, 16#0073#, 16#0070#, 16#0061#, 16#0072#, 16#0065#, 16#006E#, 16#0074#, 16#002C#, 16#0020#, 16#0077#, 16#0068#, 16#0069#, 16#006C#, 16#0065#, 16#0020#, 16#0061#, 16#0020#, 16#0076#, 16#0061#, 16#006C#, 16#0075#, 16#0065#, 16#0020#, 16#006F#, 16#0066#, 16#0020#, 16#0031#, 16#0020#, 16#006D#, 16#0065#, 16#0061#, 16#006E#, 16#0073#, 16#0020#, 16#0074#, 16#006F#, 16#0074#, 16#0061#, 16#006C#, 16#006C#, 16#0079#, 16#0020#, 16#006F#, 16#0070#, 16#0061#, 16#0071#, 16#0075#, 16#0065#, 16#002E#, 16#0020#, 16#0054#, 16#0068#, 16#0065#, 16#0020#, 16#0064#, 16#0065#, 16#0066#, 16#0061#, 16#0075#, 16#006C#, 16#0074#, 16#0020#, 16#0069#, 16#0073#, 16#0020#, 16#0031#, 16#002E#, others => 16#0000#), others => <>); -- "the text alignment when wrapped into multiple lines." MS_005D : aliased Matreshka.Internals.Strings.Shared_String := (Capacity => 55, Unused => 52, Length => 52, Value => (16#0074#, 16#0068#, 16#0065#, 16#0020#, 16#0074#, 16#0065#, 16#0078#, 16#0074#, 16#0020#, 16#0061#, 16#006C#, 16#0069#, 16#0067#, 16#006E#, 16#006D#, 16#0065#, 16#006E#, 16#0074#, 16#0020#, 16#0077#, 16#0068#, 16#0065#, 16#006E#, 16#0020#, 16#0077#, 16#0072#, 16#0061#, 16#0070#, 16#0070#, 16#0065#, 16#0064#, 16#0020#, 16#0069#, 16#006E#, 16#0074#, 16#006F#, 16#0020#, 16#006D#, 16#0075#, 16#006C#, 16#0074#, 16#0069#, 16#0070#, 16#006C#, 16#0065#, 16#0020#, 16#006C#, 16#0069#, 16#006E#, 16#0065#, 16#0073#, 16#002E#, others => 16#0000#), others => <>); -- "valid_dash_length_size" MS_005E : aliased Matreshka.Internals.Strings.Shared_String := (Capacity => 23, Unused => 22, Length => 22, Value => (16#0076#, 16#0061#, 16#006C#, 16#0069#, 16#0064#, 16#005F#, 16#0064#, 16#0061#, 16#0073#, 16#0068#, 16#005F#, 16#006C#, 16#0065#, 16#006E#, 16#0067#, 16#0074#, 16#0068#, 16#005F#, 16#0073#, 16#0069#, 16#007A#, 16#0065#, others => 16#0000#), others => <>); -- "Marker" MS_005F : aliased Matreshka.Internals.Strings.Shared_String := (Capacity => 7, Unused => 6, Length => 6, Value => (16#004D#, 16#0061#, 16#0072#, 16#006B#, 16#0065#, 16#0072#, others => 16#0000#), others => <>); -- "a real number (>=0 and >=1) representing a ratio of the graphical element's width that is the y focus point of the gradient." MS_0060 : aliased Matreshka.Internals.Strings.Shared_String := (Capacity => 127, Unused => 124, Length => 124, Value => (16#0061#, 16#0020#, 16#0072#, 16#0065#, 16#0061#, 16#006C#, 16#0020#, 16#006E#, 16#0075#, 16#006D#, 16#0062#, 16#0065#, 16#0072#, 16#0020#, 16#0028#, 16#003E#, 16#003D#, 16#0030#, 16#0020#, 16#0061#, 16#006E#, 16#0064#, 16#0020#, 16#003E#, 16#003D#, 16#0031#, 16#0029#, 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#0061#, 16#0020#, 16#0072#, 16#0061#, 16#0074#, 16#0069#, 16#006F#, 16#0020#, 16#006F#, 16#0066#, 16#0020#, 16#0074#, 16#0068#, 16#0065#, 16#0020#, 16#0067#, 16#0072#, 16#0061#, 16#0070#, 16#0068#, 16#0069#, 16#0063#, 16#0061#, 16#006C#, 16#0020#, 16#0065#, 16#006C#, 16#0065#, 16#006D#, 16#0065#, 16#006E#, 16#0074#, 16#0027#, 16#0073#, 16#0020#, 16#0077#, 16#0069#, 16#0064#, 16#0074#, 16#0068#, 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#0079#, 16#0020#, 16#0066#, 16#006F#, 16#0063#, 16#0075#, 16#0073#, 16#0020#, 16#0070#, 16#006F#, 16#0069#, 16#006E#, 16#0074#, 16#0020#, 16#006F#, 16#0066#, 16#0020#, 16#0074#, 16#0068#, 16#0065#, 16#0020#, 16#0067#, 16#0072#, 16#0061#, 16#0064#, 16#0069#, 16#0065#, 16#006E#, 16#0074#, 16#002E#, others => 16#0000#), others => <>); -- "the ending point of the line in the x-y coordinate system." MS_0061 : aliased Matreshka.Internals.Strings.Shared_String := (Capacity => 63, Unused => 58, Length => 58, Value => (16#0074#, 16#0068#, 16#0065#, 16#0020#, 16#0065#, 16#006E#, 16#0064#, 16#0069#, 16#006E#, 16#0067#, 16#0020#, 16#0070#, 16#006F#, 16#0069#, 16#006E#, 16#0074#, 16#0020#, 16#006F#, 16#0066#, 16#0020#, 16#0074#, 16#0068#, 16#0065#, 16#0020#, 16#006C#, 16#0069#, 16#006E#, 16#0065#, 16#0020#, 16#0069#, 16#006E#, 16#0020#, 16#0074#, 16#0068#, 16#0065#, 16#0020#, 16#0078#, 16#002D#, 16#0079#, 16#0020#, 16#0063#, 16#006F#, 16#006F#, 16#0072#, 16#0064#, 16#0069#, 16#006E#, 16#0061#, 16#0074#, 16#0065#, 16#0020#, 16#0073#, 16#0079#, 16#0073#, 16#0074#, 16#0065#, 16#006D#, 16#002E#, others => 16#0000#), others => <>); -- "the two radii of the ellipse from which the arc is created." MS_0062 : aliased Matreshka.Internals.Strings.Shared_String := (Capacity => 63, Unused => 59, Length => 59, Value => (16#0074#, 16#0068#, 16#0065#, 16#0020#, 16#0074#, 16#0077#, 16#006F#, 16#0020#, 16#0072#, 16#0061#, 16#0064#, 16#0069#, 16#0069#, 16#0020#, 16#006F#, 16#0066#, 16#0020#, 16#0074#, 16#0068#, 16#0065#, 16#0020#, 16#0065#, 16#006C#, 16#006C#, 16#0069#, 16#0070#, 16#0073#, 16#0065#, 16#0020#, 16#0066#, 16#0072#, 16#006F#, 16#006D#, 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#0072#, 16#0063#, 16#0020#, 16#0069#, 16#0073#, 16#0020#, 16#0063#, 16#0072#, 16#0065#, 16#0061#, 16#0074#, 16#0065#, 16#0064#, 16#002E#, others => 16#0000#), others => <>); -- "a dimension that specifies the two radii of the ellipse (a width along the x-axis and a height along the y-axis)" MS_0063 : aliased Matreshka.Internals.Strings.Shared_String := (Capacity => 119, Unused => 112, Length => 112, Value => (16#0061#, 16#0020#, 16#0064#, 16#0069#, 16#006D#, 16#0065#, 16#006E#, 16#0073#, 16#0069#, 16#006F#, 16#006E#, 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#0074#, 16#0077#, 16#006F#, 16#0020#, 16#0072#, 16#0061#, 16#0064#, 16#0069#, 16#0069#, 16#0020#, 16#006F#, 16#0066#, 16#0020#, 16#0074#, 16#0068#, 16#0065#, 16#0020#, 16#0065#, 16#006C#, 16#006C#, 16#0069#, 16#0070#, 16#0073#, 16#0065#, 16#0020#, 16#0028#, 16#0061#, 16#0020#, 16#0077#, 16#0069#, 16#0064#, 16#0074#, 16#0068#, 16#0020#, 16#0061#, 16#006C#, 16#006F#, 16#006E#, 16#0067#, 16#0020#, 16#0074#, 16#0068#, 16#0065#, 16#0020#, 16#0078#, 16#002D#, 16#0061#, 16#0078#, 16#0069#, 16#0073#, 16#0020#, 16#0061#, 16#006E#, 16#0064#, 16#0020#, 16#0061#, 16#0020#, 16#0068#, 16#0065#, 16#0069#, 16#0067#, 16#0068#, 16#0074#, 16#0020#, 16#0061#, 16#006C#, 16#006F#, 16#006E#, 16#0067#, 16#0020#, 16#0074#, 16#0068#, 16#0065#, 16#0020#, 16#0079#, 16#002D#, 16#0061#, 16#0078#, 16#0069#, 16#0073#, 16#0029#, others => 16#0000#), others => <>); -- "EllipticalArcTo is a kind of path command that draws an elliptical arc from the current point to a new point in the coordinate system." MS_0064 : aliased Matreshka.Internals.Strings.Shared_String := (Capacity => 143, Unused => 134, Length => 134, Value => (16#0045#, 16#006C#, 16#006C#, 16#0069#, 16#0070#, 16#0074#, 16#0069#, 16#0063#, 16#0061#, 16#006C#, 16#0041#, 16#0072#, 16#0063#, 16#0054#, 16#006F#, 16#0020#, 16#0069#, 16#0073#, 16#0020#, 16#0061#, 16#0020#, 16#006B#, 16#0069#, 16#006E#, 16#0064#, 16#0020#, 16#006F#, 16#0066#, 16#0020#, 16#0070#, 16#0061#, 16#0074#, 16#0068#, 16#0020#, 16#0063#, 16#006F#, 16#006D#, 16#006D#, 16#0061#, 16#006E#, 16#0064#, 16#0020#, 16#0074#, 16#0068#, 16#0061#, 16#0074#, 16#0020#, 16#0064#, 16#0072#, 16#0061#, 16#0077#, 16#0073#, 16#0020#, 16#0061#, 16#006E#, 16#0020#, 16#0065#, 16#006C#, 16#006C#, 16#0069#, 16#0070#, 16#0074#, 16#0069#, 16#0063#, 16#0061#, 16#006C#, 16#0020#, 16#0061#, 16#0072#, 16#0063#, 16#0020#, 16#0066#, 16#0072#, 16#006F#, 16#006D#, 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#0070#, 16#006F#, 16#0069#, 16#006E#, 16#0074#, 16#0020#, 16#0074#, 16#006F#, 16#0020#, 16#0061#, 16#0020#, 16#006E#, 16#0065#, 16#0077#, 16#0020#, 16#0070#, 16#006F#, 16#0069#, 16#006E#, 16#0074#, 16#0020#, 16#0069#, 16#006E#, 16#0020#, 16#0074#, 16#0068#, 16#0065#, 16#0020#, 16#0063#, 16#006F#, 16#006F#, 16#0072#, 16#0064#, 16#0069#, 16#006E#, 16#0061#, 16#0074#, 16#0065#, 16#0020#, 16#0073#, 16#0079#, 16#0073#, 16#0074#, 16#0065#, 16#006D#, 16#002E#, others => 16#0000#), others => <>); -- "a real number (>=0 and >=1) representing a ratio of the graphical element's size that is the radius of the gradient." MS_0065 : aliased Matreshka.Internals.Strings.Shared_String := (Capacity => 119, Unused => 116, Length => 116, Value => (16#0061#, 16#0020#, 16#0072#, 16#0065#, 16#0061#, 16#006C#, 16#0020#, 16#006E#, 16#0075#, 16#006D#, 16#0062#, 16#0065#, 16#0072#, 16#0020#, 16#0028#, 16#003E#, 16#003D#, 16#0030#, 16#0020#, 16#0061#, 16#006E#, 16#0064#, 16#0020#, 16#003E#, 16#003D#, 16#0031#, 16#0029#, 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#0061#, 16#0020#, 16#0072#, 16#0061#, 16#0074#, 16#0069#, 16#006F#, 16#0020#, 16#006F#, 16#0066#, 16#0020#, 16#0074#, 16#0068#, 16#0065#, 16#0020#, 16#0067#, 16#0072#, 16#0061#, 16#0070#, 16#0068#, 16#0069#, 16#0063#, 16#0061#, 16#006C#, 16#0020#, 16#0065#, 16#006C#, 16#0065#, 16#006D#, 16#0065#, 16#006E#, 16#0074#, 16#0027#, 16#0073#, 16#0020#, 16#0073#, 16#0069#, 16#007A#, 16#0065#, 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#0072#, 16#0061#, 16#0064#, 16#0069#, 16#0075#, 16#0073#, 16#0020#, 16#006F#, 16#0066#, 16#0020#, 16#0074#, 16#0068#, 16#0065#, 16#0020#, 16#0067#, 16#0072#, 16#0061#, 16#0064#, 16#0069#, 16#0065#, 16#006E#, 16#0074#, 16#002E#, others => 16#0000#), others => <>); -- "stop" MS_0066 : aliased Matreshka.Internals.Strings.Shared_String := (Capacity => 7, Unused => 4, Length => 4, Value => (16#0073#, 16#0074#, 16#006F#, 16#0070#, others => 16#0000#), others => <>); -- "reference" MS_0067 : aliased Matreshka.Internals.Strings.Shared_String := (Capacity => 15, Unused => 9, Length => 9, Value => (16#0072#, 16#0065#, 16#0066#, 16#0065#, 16#0072#, 16#0065#, 16#006E#, 16#0063#, 16#0065#, others => 16#0000#), others => <>); -- "A_fill_canvas" MS_0068 : aliased Matreshka.Internals.Strings.Shared_String := (Capacity => 15, Unused => 13, Length => 13, Value => (16#0041#, 16#005F#, 16#0066#, 16#0069#, 16#006C#, 16#006C#, 16#005F#, 16#0063#, 16#0061#, 16#006E#, 16#0076#, 16#0061#, 16#0073#, others => 16#0000#), others => <>); -- "A_midMarker_markedElement" MS_0069 : aliased Matreshka.Internals.Strings.Shared_String := (Capacity => 31, Unused => 25, Length => 25, Value => (16#0041#, 16#005F#, 16#006D#, 16#0069#, 16#0064#, 16#004D#, 16#0061#, 16#0072#, 16#006B#, 16#0065#, 16#0072#, 16#005F#, 16#006D#, 16#0061#, 16#0072#, 16#006B#, 16#0065#, 16#0064#, 16#0045#, 16#006C#, 16#0065#, 16#006D#, 16#0065#, 16#006E#, 16#0074#, others => 16#0000#), others => <>); -- "an optional end marker that aligns with the last vertex of the marked element." MS_006A : aliased Matreshka.Internals.Strings.Shared_String := (Capacity => 87, Unused => 78, Length => 78, Value => (16#0061#, 16#006E#, 16#0020#, 16#006F#, 16#0070#, 16#0074#, 16#0069#, 16#006F#, 16#006E#, 16#0061#, 16#006C#, 16#0020#, 16#0065#, 16#006E#, 16#0064#, 16#0020#, 16#006D#, 16#0061#, 16#0072#, 16#006B#, 16#0065#, 16#0072#, 16#0020#, 16#0074#, 16#0068#, 16#0061#, 16#0074#, 16#0020#, 16#0061#, 16#006C#, 16#0069#, 16#0067#, 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#006C#, 16#0061#, 16#0073#, 16#0074#, 16#0020#, 16#0076#, 16#0065#, 16#0072#, 16#0074#, 16#0065#, 16#0078#, 16#0020#, 16#006F#, 16#0066#, 16#0020#, 16#0074#, 16#0068#, 16#0065#, 16#0020#, 16#006D#, 16#0061#, 16#0072#, 16#006B#, 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 color of the stroke used to paint the outline of a graphical element. The default is black (red=0, green=0, blue=0)." MS_006B : aliased Matreshka.Internals.Strings.Shared_String := (Capacity => 127, Unused => 120, Length => 120, Value => (16#0074#, 16#0068#, 16#0065#, 16#0020#, 16#0063#, 16#006F#, 16#006C#, 16#006F#, 16#0072#, 16#0020#, 16#006F#, 16#0066#, 16#0020#, 16#0074#, 16#0068#, 16#0065#, 16#0020#, 16#0073#, 16#0074#, 16#0072#, 16#006F#, 16#006B#, 16#0065#, 16#0020#, 16#0075#, 16#0073#, 16#0065#, 16#0064#, 16#0020#, 16#0074#, 16#006F#, 16#0020#, 16#0070#, 16#0061#, 16#0069#, 16#006E#, 16#0074#, 16#0020#, 16#0074#, 16#0068#, 16#0065#, 16#0020#, 16#006F#, 16#0075#, 16#0074#, 16#006C#, 16#0069#, 16#006E#, 16#0065#, 16#0020#, 16#006F#, 16#0066#, 16#0020#, 16#0061#, 16#0020#, 16#0067#, 16#0072#, 16#0061#, 16#0070#, 16#0068#, 16#0069#, 16#0063#, 16#0061#, 16#006C#, 16#0020#, 16#0065#, 16#006C#, 16#0065#, 16#006D#, 16#0065#, 16#006E#, 16#0074#, 16#002E#, 16#0020#, 16#0054#, 16#0068#, 16#0065#, 16#0020#, 16#0064#, 16#0065#, 16#0066#, 16#0061#, 16#0075#, 16#006C#, 16#0074#, 16#0020#, 16#0069#, 16#0073#, 16#0020#, 16#0062#, 16#006C#, 16#0061#, 16#0063#, 16#006B#, 16#0020#, 16#0028#, 16#0072#, 16#0065#, 16#0064#, 16#003D#, 16#0030#, 16#002C#, 16#0020#, 16#0067#, 16#0072#, 16#0065#, 16#0065#, 16#006E#, 16#003D#, 16#0030#, 16#002C#, 16#0020#, 16#0062#, 16#006C#, 16#0075#, 16#0065#, 16#003D#, 16#0030#, 16#0029#, 16#002E#, others => 16#0000#), others => <>); -- "valid_gradient_vector" MS_006C : aliased Matreshka.Internals.Strings.Shared_String := (Capacity => 23, Unused => 21, Length => 21, Value => (16#0076#, 16#0061#, 16#006C#, 16#0069#, 16#0064#, 16#005F#, 16#0067#, 16#0072#, 16#0061#, 16#0064#, 16#0069#, 16#0065#, 16#006E#, 16#0074#, 16#005F#, 16#0076#, 16#0065#, 16#0063#, 16#0074#, 16#006F#, 16#0072#, others => 16#0000#), others => <>); -- "strokeWidth" MS_006D : aliased Matreshka.Internals.Strings.Shared_String := (Capacity => 15, Unused => 11, Length => 11, Value => (16#0073#, 16#0074#, 16#0072#, 16#006F#, 16#006B#, 16#0065#, 16#0057#, 16#0069#, 16#0064#, 16#0074#, 16#0068#, others => 16#0000#), others => <>); -- "the font size is non-negative" MS_006E : aliased Matreshka.Internals.Strings.Shared_String := (Capacity => 31, Unused => 29, Length => 29, Value => (16#0074#, 16#0068#, 16#0065#, 16#0020#, 16#0066#, 16#006F#, 16#006E#, 16#0074#, 16#0020#, 16#0073#, 16#0069#, 16#007A#, 16#0065#, 16#0020#, 16#0069#, 16#0073#, 16#0020#, 16#006E#, 16#006F#, 16#006E#, 16#002D#, 16#006E#, 16#0065#, 16#0067#, 16#0061#, 16#0074#, 16#0069#, 16#0076#, 16#0065#, others => 16#0000#), others => <>); -- "CubicCurveTo is a kind of path command that draws a cubic bézier curve from the current point to a new point using a start and an end control points." MS_006F : aliased Matreshka.Internals.Strings.Shared_String := (Capacity => 159, Unused => 149, Length => 149, Value => (16#0043#, 16#0075#, 16#0062#, 16#0069#, 16#0063#, 16#0043#, 16#0075#, 16#0072#, 16#0076#, 16#0065#, 16#0054#, 16#006F#, 16#0020#, 16#0069#, 16#0073#, 16#0020#, 16#0061#, 16#0020#, 16#006B#, 16#0069#, 16#006E#, 16#0064#, 16#0020#, 16#006F#, 16#0066#, 16#0020#, 16#0070#, 16#0061#, 16#0074#, 16#0068#, 16#0020#, 16#0063#, 16#006F#, 16#006D#, 16#006D#, 16#0061#, 16#006E#, 16#0064#, 16#0020#, 16#0074#, 16#0068#, 16#0061#, 16#0074#, 16#0020#, 16#0064#, 16#0072#, 16#0061#, 16#0077#, 16#0073#, 16#0020#, 16#0061#, 16#0020#, 16#0063#, 16#0075#, 16#0062#, 16#0069#, 16#0063#, 16#0020#, 16#0062#, 16#00E9#, 16#007A#, 16#0069#, 16#0065#, 16#0072#, 16#0020#, 16#0063#, 16#0075#, 16#0072#, 16#0076#, 16#0065#, 16#0020#, 16#0066#, 16#0072#, 16#006F#, 16#006D#, 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#0070#, 16#006F#, 16#0069#, 16#006E#, 16#0074#, 16#0020#, 16#0074#, 16#006F#, 16#0020#, 16#0061#, 16#0020#, 16#006E#, 16#0065#, 16#0077#, 16#0020#, 16#0070#, 16#006F#, 16#0069#, 16#006E#, 16#0074#, 16#0020#, 16#0075#, 16#0073#, 16#0069#, 16#006E#, 16#0067#, 16#0020#, 16#0061#, 16#0020#, 16#0073#, 16#0074#, 16#0061#, 16#0072#, 16#0074#, 16#0020#, 16#0061#, 16#006E#, 16#0064#, 16#0020#, 16#0061#, 16#006E#, 16#0020#, 16#0065#, 16#006E#, 16#0064#, 16#0020#, 16#0063#, 16#006F#, 16#006E#, 16#0074#, 16#0072#, 16#006F#, 16#006C#, 16#0020#, 16#0070#, 16#006F#, 16#0069#, 16#006E#, 16#0074#, 16#0073#, 16#002E#, others => 16#0000#), others => <>); -- "LinearGradient is a kind of gradient that fills a graphical element by smoothly changing color values along a vector." MS_0070 : aliased Matreshka.Internals.Strings.Shared_String := (Capacity => 127, Unused => 117, Length => 117, Value => (16#004C#, 16#0069#, 16#006E#, 16#0065#, 16#0061#, 16#0072#, 16#0047#, 16#0072#, 16#0061#, 16#0064#, 16#0069#, 16#0065#, 16#006E#, 16#0074#, 16#0020#, 16#0069#, 16#0073#, 16#0020#, 16#0061#, 16#0020#, 16#006B#, 16#0069#, 16#006E#, 16#0064#, 16#0020#, 16#006F#, 16#0066#, 16#0020#, 16#0067#, 16#0072#, 16#0061#, 16#0064#, 16#0069#, 16#0065#, 16#006E#, 16#0074#, 16#0020#, 16#0074#, 16#0068#, 16#0061#, 16#0074#, 16#0020#, 16#0066#, 16#0069#, 16#006C#, 16#006C#, 16#0073#, 16#0020#, 16#0061#, 16#0020#, 16#0067#, 16#0072#, 16#0061#, 16#0070#, 16#0068#, 16#0069#, 16#0063#, 16#0061#, 16#006C#, 16#0020#, 16#0065#, 16#006C#, 16#0065#, 16#006D#, 16#0065#, 16#006E#, 16#0074#, 16#0020#, 16#0062#, 16#0079#, 16#0020#, 16#0073#, 16#006D#, 16#006F#, 16#006F#, 16#0074#, 16#0068#, 16#006C#, 16#0079#, 16#0020#, 16#0063#, 16#0068#, 16#0061#, 16#006E#, 16#0067#, 16#0069#, 16#006E#, 16#0067#, 16#0020#, 16#0063#, 16#006F#, 16#006C#, 16#006F#, 16#0072#, 16#0020#, 16#0076#, 16#0061#, 16#006C#, 16#0075#, 16#0065#, 16#0073#, 16#0020#, 16#0061#, 16#006C#, 16#006F#, 16#006E#, 16#0067#, 16#0020#, 16#0061#, 16#0020#, 16#0076#, 16#0065#, 16#0063#, 16#0074#, 16#006F#, 16#0072#, 16#002E#, others => 16#0000#), others => <>); -- "Path is a marked element that defines a custom shape whose geometry is specified with a sequence of path commands." MS_0071 : aliased Matreshka.Internals.Strings.Shared_String := (Capacity => 119, Unused => 114, Length => 114, Value => (16#0050#, 16#0061#, 16#0074#, 16#0068#, 16#0020#, 16#0069#, 16#0073#, 16#0020#, 16#0061#, 16#0020#, 16#006D#, 16#0061#, 16#0072#, 16#006B#, 16#0065#, 16#0064#, 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#0064#, 16#0065#, 16#0066#, 16#0069#, 16#006E#, 16#0065#, 16#0073#, 16#0020#, 16#0061#, 16#0020#, 16#0063#, 16#0075#, 16#0073#, 16#0074#, 16#006F#, 16#006D#, 16#0020#, 16#0073#, 16#0068#, 16#0061#, 16#0070#, 16#0065#, 16#0020#, 16#0077#, 16#0068#, 16#006F#, 16#0073#, 16#0065#, 16#0020#, 16#0067#, 16#0065#, 16#006F#, 16#006D#, 16#0065#, 16#0074#, 16#0072#, 16#0079#, 16#0020#, 16#0069#, 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#0077#, 16#0069#, 16#0074#, 16#0068#, 16#0020#, 16#0061#, 16#0020#, 16#0073#, 16#0065#, 16#0071#, 16#0075#, 16#0065#, 16#006E#, 16#0063#, 16#0065#, 16#0020#, 16#006F#, 16#0066#, 16#0020#, 16#0070#, 16#0061#, 16#0074#, 16#0068#, 16#0020#, 16#0063#, 16#006F#, 16#006D#, 16#006D#, 16#0061#, 16#006E#, 16#0064#, 16#0073#, 16#002E#, others => 16#0000#), others => <>); -- "Path" MS_0072 : aliased Matreshka.Internals.Strings.Shared_String := (Capacity => 7, Unused => 4, Length => 4, Value => (16#0050#, 16#0061#, 16#0074#, 16#0068#, others => 16#0000#), others => <>); -- "a real number representing a rotation (in degrees) of the ellipse from which the arc is created." MS_0073 : aliased Matreshka.Internals.Strings.Shared_String := (Capacity => 103, Unused => 96, Length => 96, Value => (16#0061#, 16#0020#, 16#0072#, 16#0065#, 16#0061#, 16#006C#, 16#0020#, 16#006E#, 16#0075#, 16#006D#, 16#0062#, 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#0069#, 16#006E#, 16#0067#, 16#0020#, 16#0061#, 16#0020#, 16#0072#, 16#006F#, 16#0074#, 16#0061#, 16#0074#, 16#0069#, 16#006F#, 16#006E#, 16#0020#, 16#0028#, 16#0069#, 16#006E#, 16#0020#, 16#0064#, 16#0065#, 16#0067#, 16#0072#, 16#0065#, 16#0065#, 16#0073#, 16#0029#, 16#0020#, 16#006F#, 16#0066#, 16#0020#, 16#0074#, 16#0068#, 16#0065#, 16#0020#, 16#0065#, 16#006C#, 16#006C#, 16#0069#, 16#0070#, 16#0073#, 16#0065#, 16#0020#, 16#0066#, 16#0072#, 16#006F#, 16#006D#, 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#0072#, 16#0063#, 16#0020#, 16#0069#, 16#0073#, 16#0020#, 16#0063#, 16#0072#, 16#0065#, 16#0061#, 16#0074#, 16#0065#, 16#0064#, 16#002E#, others => 16#0000#), others => <>); -- "a set of fills packaged by the canvas and referenced by graphical elements in the canvas." MS_0074 : aliased Matreshka.Internals.Strings.Shared_String := (Capacity => 95, Unused => 89, Length => 89, Value => (16#0061#, 16#0020#, 16#0073#, 16#0065#, 16#0074#, 16#0020#, 16#006F#, 16#0066#, 16#0020#, 16#0066#, 16#0069#, 16#006C#, 16#006C#, 16#0073#, 16#0020#, 16#0070#, 16#0061#, 16#0063#, 16#006B#, 16#0061#, 16#0067#, 16#0065#, 16#0064#, 16#0020#, 16#0062#, 16#0079#, 16#0020#, 16#0074#, 16#0068#, 16#0065#, 16#0020#, 16#0063#, 16#0061#, 16#006E#, 16#0076#, 16#0061#, 16#0073#, 16#0020#, 16#0061#, 16#006E#, 16#0064#, 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#0067#, 16#0072#, 16#0061#, 16#0070#, 16#0068#, 16#0069#, 16#0063#, 16#0061#, 16#006C#, 16#0020#, 16#0065#, 16#006C#, 16#0065#, 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#0063#, 16#0061#, 16#006E#, 16#0076#, 16#0061#, 16#0073#, 16#002E#, others => 16#0000#), others => <>); -- "Matrix is a kind of transform that represents any transform operation with a 3x3 transformation matrix." MS_0075 : aliased Matreshka.Internals.Strings.Shared_String := (Capacity => 111, Unused => 103, Length => 103, Value => (16#004D#, 16#0061#, 16#0074#, 16#0072#, 16#0069#, 16#0078#, 16#0020#, 16#0069#, 16#0073#, 16#0020#, 16#0061#, 16#0020#, 16#006B#, 16#0069#, 16#006E#, 16#0064#, 16#0020#, 16#006F#, 16#0066#, 16#0020#, 16#0074#, 16#0072#, 16#0061#, 16#006E#, 16#0073#, 16#0066#, 16#006F#, 16#0072#, 16#006D#, 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#0061#, 16#006E#, 16#0079#, 16#0020#, 16#0074#, 16#0072#, 16#0061#, 16#006E#, 16#0073#, 16#0066#, 16#006F#, 16#0072#, 16#006D#, 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#0069#, 16#0074#, 16#0068#, 16#0020#, 16#0061#, 16#0020#, 16#0033#, 16#0078#, 16#0033#, 16#0020#, 16#0074#, 16#0072#, 16#0061#, 16#006E#, 16#0073#, 16#0066#, 16#006F#, 16#0072#, 16#006D#, 16#0061#, 16#0074#, 16#0069#, 16#006F#, 16#006E#, 16#0020#, 16#006D#, 16#0061#, 16#0074#, 16#0072#, 16#0069#, 16#0078#, 16#002E#, others => 16#0000#), others => <>); -- "valid_stroke_opacity" MS_0076 : aliased Matreshka.Internals.Strings.Shared_String := (Capacity => 23, Unused => 20, Length => 20, Value => (16#0076#, 16#0061#, 16#006C#, 16#0069#, 16#0064#, 16#005F#, 16#0073#, 16#0074#, 16#0072#, 16#006F#, 16#006B#, 16#0065#, 16#005F#, 16#006F#, 16#0070#, 16#0061#, 16#0063#, 16#0069#, 16#0074#, 16#0079#, others => 16#0000#), others => <>); -- "the bounds of the rectangle in the x-y coordinate system." MS_0077 : aliased Matreshka.Internals.Strings.Shared_String := (Capacity => 63, Unused => 57, Length => 57, Value => (16#0074#, 16#0068#, 16#0065#, 16#0020#, 16#0062#, 16#006F#, 16#0075#, 16#006E#, 16#0064#, 16#0073#, 16#0020#, 16#006F#, 16#0066#, 16#0020#, 16#0074#, 16#0068#, 16#0065#, 16#0020#, 16#0072#, 16#0065#, 16#0063#, 16#0074#, 16#0061#, 16#006E#, 16#0067#, 16#006C#, 16#0065#, 16#0020#, 16#0069#, 16#006E#, 16#0020#, 16#0074#, 16#0068#, 16#0065#, 16#0020#, 16#0078#, 16#002D#, 16#0079#, 16#0020#, 16#0063#, 16#006F#, 16#006F#, 16#0072#, 16#0064#, 16#0069#, 16#006E#, 16#0061#, 16#0074#, 16#0065#, 16#0020#, 16#0073#, 16#0079#, 16#0073#, 16#0074#, 16#0065#, 16#006D#, 16#002E#, others => 16#0000#), others => <>); -- "the URL of a referenced image file." MS_0078 : aliased Matreshka.Internals.Strings.Shared_String := (Capacity => 39, Unused => 35, Length => 35, Value => (16#0074#, 16#0068#, 16#0065#, 16#0020#, 16#0055#, 16#0052#, 16#004C#, 16#0020#, 16#006F#, 16#0066#, 16#0020#, 16#0061#, 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#0069#, 16#006D#, 16#0061#, 16#0067#, 16#0065#, 16#0020#, 16#0066#, 16#0069#, 16#006C#, 16#0065#, 16#002E#, others => 16#0000#), others => <>); -- "size" MS_0079 : aliased Matreshka.Internals.Strings.Shared_String := (Capacity => 7, Unused => 4, Length => 4, Value => (16#0073#, 16#0069#, 16#007A#, 16#0065#, others => 16#0000#), others => <>); -- "MarkedElement is a graphic element that can be decorated at its vertices with markers (e.g. arrowheads)." MS_007A : aliased Matreshka.Internals.Strings.Shared_String := (Capacity => 111, Unused => 104, Length => 104, Value => (16#004D#, 16#0061#, 16#0072#, 16#006B#, 16#0065#, 16#0064#, 16#0045#, 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#0067#, 16#0072#, 16#0061#, 16#0070#, 16#0068#, 16#0069#, 16#0063#, 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#0063#, 16#0061#, 16#006E#, 16#0020#, 16#0062#, 16#0065#, 16#0020#, 16#0064#, 16#0065#, 16#0063#, 16#006F#, 16#0072#, 16#0061#, 16#0074#, 16#0065#, 16#0064#, 16#0020#, 16#0061#, 16#0074#, 16#0020#, 16#0069#, 16#0074#, 16#0073#, 16#0020#, 16#0076#, 16#0065#, 16#0072#, 16#0074#, 16#0069#, 16#0063#, 16#0065#, 16#0073#, 16#0020#, 16#0077#, 16#0069#, 16#0074#, 16#0068#, 16#0020#, 16#006D#, 16#0061#, 16#0072#, 16#006B#, 16#0065#, 16#0072#, 16#0073#, 16#0020#, 16#0028#, 16#0065#, 16#002E#, 16#0067#, 16#002E#, 16#0020#, 16#0061#, 16#0072#, 16#0072#, 16#006F#, 16#0077#, 16#0068#, 16#0065#, 16#0061#, 16#0064#, 16#0073#, 16#0029#, 16#002E#, others => 16#0000#), others => <>); -- "start" MS_007B : aliased Matreshka.Internals.Strings.Shared_String := (Capacity => 7, Unused => 5, Length => 5, Value => (16#0073#, 16#0074#, 16#0061#, 16#0072#, 16#0074#, others => 16#0000#), others => <>); -- "Polyline" MS_007C : aliased Matreshka.Internals.Strings.Shared_String := (Capacity => 15, Unused => 8, Length => 8, Value => (16#0050#, 16#006F#, 16#006C#, 16#0079#, 16#006C#, 16#0069#, 16#006E#, 16#0065#, others => 16#0000#), others => <>); -- "a list of zero or more transforms to apply to this graphical element." MS_007D : aliased Matreshka.Internals.Strings.Shared_String := (Capacity => 71, Unused => 69, Length => 69, Value => (16#0061#, 16#0020#, 16#006C#, 16#0069#, 16#0073#, 16#0074#, 16#0020#, 16#006F#, 16#0066#, 16#0020#, 16#007A#, 16#0065#, 16#0072#, 16#006F#, 16#0020#, 16#006F#, 16#0072#, 16#0020#, 16#006D#, 16#006F#, 16#0072#, 16#0065#, 16#0020#, 16#0074#, 16#0072#, 16#0061#, 16#006E#, 16#0073#, 16#0066#, 16#006F#, 16#0072#, 16#006D#, 16#0073#, 16#0020#, 16#0074#, 16#006F#, 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#0067#, 16#0072#, 16#0061#, 16#0070#, 16#0068#, 16#0069#, 16#0063#, 16#0061#, 16#006C#, 16#0020#, 16#0065#, 16#006C#, 16#0065#, 16#006D#, 16#0065#, 16#006E#, 16#0074#, 16#002E#, others => 16#0000#), others => <>); -- "the name of the font used to render a text element (e.g. "Times New Roman", "Arial" or "Helvetica"). The default is "Arial"." MS_007E : aliased Matreshka.Internals.Strings.Shared_String := (Capacity => 127, Unused => 124, Length => 124, Value => (16#0074#, 16#0068#, 16#0065#, 16#0020#, 16#006E#, 16#0061#, 16#006D#, 16#0065#, 16#0020#, 16#006F#, 16#0066#, 16#0020#, 16#0074#, 16#0068#, 16#0065#, 16#0020#, 16#0066#, 16#006F#, 16#006E#, 16#0074#, 16#0020#, 16#0075#, 16#0073#, 16#0065#, 16#0064#, 16#0020#, 16#0074#, 16#006F#, 16#0020#, 16#0072#, 16#0065#, 16#006E#, 16#0064#, 16#0065#, 16#0072#, 16#0020#, 16#0061#, 16#0020#, 16#0074#, 16#0065#, 16#0078#, 16#0074#, 16#0020#, 16#0065#, 16#006C#, 16#0065#, 16#006D#, 16#0065#, 16#006E#, 16#0074#, 16#0020#, 16#0028#, 16#0065#, 16#002E#, 16#0067#, 16#002E#, 16#0020#, 16#0022#, 16#0054#, 16#0069#, 16#006D#, 16#0065#, 16#0073#, 16#0020#, 16#004E#, 16#0065#, 16#0077#, 16#0020#, 16#0052#, 16#006F#, 16#006D#, 16#0061#, 16#006E#, 16#0022#, 16#002C#, 16#0020#, 16#0022#, 16#0041#, 16#0072#, 16#0069#, 16#0061#, 16#006C#, 16#0022#, 16#0020#, 16#006F#, 16#0072#, 16#0020#, 16#0022#, 16#0048#, 16#0065#, 16#006C#, 16#0076#, 16#0065#, 16#0074#, 16#0069#, 16#0063#, 16#0061#, 16#0022#, 16#0029#, 16#002E#, 16#0020#, 16#0054#, 16#0068#, 16#0065#, 16#0020#, 16#0064#, 16#0065#, 16#0066#, 16#0061#, 16#0075#, 16#006C#, 16#0074#, 16#0020#, 16#0069#, 16#0073#, 16#0020#, 16#0022#, 16#0041#, 16#0072#, 16#0069#, 16#0061#, 16#006C#, 16#0022#, 16#002E#, others => 16#0000#), others => <>); -- "isRelative" MS_007F : aliased Matreshka.Internals.Strings.Shared_String := (Capacity => 15, Unused => 10, Length => 10, Value => (16#0069#, 16#0073#, 16#0052#, 16#0065#, 16#006C#, 16#0061#, 16#0074#, 16#0069#, 16#0076#, 16#0065#, others => 16#0000#), others => <>); -- "fontName" MS_0080 : aliased Matreshka.Internals.Strings.Shared_String := (Capacity => 15, Unused => 8, Length => 8, Value => (16#0066#, 16#006F#, 16#006E#, 16#0074#, 16#004E#, 16#0061#, 16#006D#, 16#0065#, others => 16#0000#), others => <>); -- "isAspectRatioPreserved" MS_0081 : aliased Matreshka.Internals.Strings.Shared_String := (Capacity => 23, Unused => 22, Length => 22, Value => (16#0069#, 16#0073#, 16#0041#, 16#0073#, 16#0070#, 16#0065#, 16#0063#, 16#0074#, 16#0052#, 16#0061#, 16#0074#, 16#0069#, 16#006F#, 16#0050#, 16#0072#, 16#0065#, 16#0073#, 16#0065#, 16#0072#, 16#0076#, 16#0065#, 16#0064#, others => 16#0000#), others => <>); -- "Fill is the abstract super class of all kinds of fills that are used to paint the interior of graphical elements." MS_0082 : aliased Matreshka.Internals.Strings.Shared_String := (Capacity => 119, Unused => 113, Length => 113, Value => (16#0046#, 16#0069#, 16#006C#, 16#006C#, 16#0020#, 16#0069#, 16#0073#, 16#0020#, 16#0074#, 16#0068#, 16#0065#, 16#0020#, 16#0061#, 16#0062#, 16#0073#, 16#0074#, 16#0072#, 16#0061#, 16#0063#, 16#0074#, 16#0020#, 16#0073#, 16#0075#, 16#0070#, 16#0065#, 16#0072#, 16#0020#, 16#0063#, 16#006C#, 16#0061#, 16#0073#, 16#0073#, 16#0020#, 16#006F#, 16#0066#, 16#0020#, 16#0061#, 16#006C#, 16#006C#, 16#0020#, 16#006B#, 16#0069#, 16#006E#, 16#0064#, 16#0073#, 16#0020#, 16#006F#, 16#0066#, 16#0020#, 16#0066#, 16#0069#, 16#006C#, 16#006C#, 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#0074#, 16#006F#, 16#0020#, 16#0070#, 16#0061#, 16#0069#, 16#006E#, 16#0074#, 16#0020#, 16#0074#, 16#0068#, 16#0065#, 16#0020#, 16#0069#, 16#006E#, 16#0074#, 16#0065#, 16#0072#, 16#0069#, 16#006F#, 16#0072#, 16#0020#, 16#006F#, 16#0066#, 16#0020#, 16#0067#, 16#0072#, 16#0061#, 16#0070#, 16#0068#, 16#0069#, 16#0063#, 16#0061#, 16#006C#, 16#0020#, 16#0065#, 16#006C#, 16#0065#, 16#006D#, 16#0065#, 16#006E#, 16#0074#, 16#0073#, 16#002E#, others => 16#0000#), others => <>); -- "whether the arc is drawn in a positive-angle direction" MS_0083 : aliased Matreshka.Internals.Strings.Shared_String := (Capacity => 55, Unused => 54, Length => 54, Value => (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#0061#, 16#0072#, 16#0063#, 16#0020#, 16#0069#, 16#0073#, 16#0020#, 16#0064#, 16#0072#, 16#0061#, 16#0077#, 16#006E#, 16#0020#, 16#0069#, 16#006E#, 16#0020#, 16#0061#, 16#0020#, 16#0070#, 16#006F#, 16#0073#, 16#0069#, 16#0074#, 16#0069#, 16#0076#, 16#0065#, 16#002D#, 16#0061#, 16#006E#, 16#0067#, 16#006C#, 16#0065#, 16#0020#, 16#0064#, 16#0069#, 16#0072#, 16#0065#, 16#0063#, 16#0074#, 16#0069#, 16#006F#, 16#006E#, others => 16#0000#), others => <>); -- "the radius must be between 0 and 1" MS_0084 : aliased Matreshka.Internals.Strings.Shared_String := (Capacity => 39, Unused => 35, Length => 35, Value => (16#0074#, 16#0068#, 16#0065#, 16#0020#, 16#0072#, 16#0061#, 16#0064#, 16#0069#, 16#0075#, 16#0073#, 16#0020#, 16#0020#, 16#006D#, 16#0075#, 16#0073#, 16#0074#, 16#0020#, 16#0062#, 16#0065#, 16#0020#, 16#0062#, 16#0065#, 16#0074#, 16#0077#, 16#0065#, 16#0065#, 16#006E#, 16#0020#, 16#0030#, 16#0020#, 16#0061#, 16#006E#, 16#0064#, 16#0020#, 16#0031#, others => 16#0000#), others => <>); -- "QuadraticCurveTo" MS_0085 : aliased Matreshka.Internals.Strings.Shared_String := (Capacity => 23, Unused => 16, Length => 16, Value => (16#0051#, 16#0075#, 16#0061#, 16#0064#, 16#0072#, 16#0061#, 16#0074#, 16#0069#, 16#0063#, 16#0043#, 16#0075#, 16#0072#, 16#0076#, 16#0065#, 16#0054#, 16#006F#, others => 16#0000#), others => <>); -- "y2" MS_0086 : aliased Matreshka.Internals.Strings.Shared_String := (Capacity => 7, Unused => 2, Length => 2, Value => (16#0079#, 16#0032#, others => 16#0000#), others => <>); -- "factorY" MS_0087 : aliased Matreshka.Internals.Strings.Shared_String := (Capacity => 15, Unused => 7, Length => 7, Value => (16#0066#, 16#0061#, 16#0063#, 16#0074#, 16#006F#, 16#0072#, 16#0059#, others => 16#0000#), others => <>); -- "Scale" MS_0088 : aliased Matreshka.Internals.Strings.Shared_String := (Capacity => 7, Unused => 5, Length => 5, Value => (16#0053#, 16#0063#, 16#0061#, 16#006C#, 16#0065#, others => 16#0000#), others => <>); -- "a real number (>=0) representing the size (in unit of length) of the font used to render a text element. The default is 10." MS_0089 : aliased Matreshka.Internals.Strings.Shared_String := (Capacity => 127, Unused => 123, Length => 123, Value => (16#0061#, 16#0020#, 16#0072#, 16#0065#, 16#0061#, 16#006C#, 16#0020#, 16#006E#, 16#0075#, 16#006D#, 16#0062#, 16#0065#, 16#0072#, 16#0020#, 16#0028#, 16#003E#, 16#003D#, 16#0030#, 16#0029#, 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#0073#, 16#0069#, 16#007A#, 16#0065#, 16#0020#, 16#0028#, 16#0069#, 16#006E#, 16#0020#, 16#0075#, 16#006E#, 16#0069#, 16#0074#, 16#0020#, 16#006F#, 16#0066#, 16#0020#, 16#006C#, 16#0065#, 16#006E#, 16#0067#, 16#0074#, 16#0068#, 16#0029#, 16#0020#, 16#006F#, 16#0066#, 16#0020#, 16#0074#, 16#0068#, 16#0065#, 16#0020#, 16#0066#, 16#006F#, 16#006E#, 16#0074#, 16#0020#, 16#0075#, 16#0073#, 16#0065#, 16#0064#, 16#0020#, 16#0074#, 16#006F#, 16#0020#, 16#0072#, 16#0065#, 16#006E#, 16#0064#, 16#0065#, 16#0072#, 16#0020#, 16#0061#, 16#0020#, 16#0074#, 16#0065#, 16#0078#, 16#0074#, 16#0020#, 16#0065#, 16#006C#, 16#0065#, 16#006D#, 16#0065#, 16#006E#, 16#0074#, 16#002E#, 16#0020#, 16#0054#, 16#0068#, 16#0065#, 16#0020#, 16#0064#, 16#0065#, 16#0066#, 16#0061#, 16#0075#, 16#006C#, 16#0074#, 16#0020#, 16#0069#, 16#0073#, 16#0020#, 16#0031#, 16#0030#, 16#002E#, others => 16#0000#), others => <>); -- "the size of the stroke dash length list must be even." MS_008A : aliased Matreshka.Internals.Strings.Shared_String := (Capacity => 55, Unused => 53, Length => 53, Value => (16#0074#, 16#0068#, 16#0065#, 16#0020#, 16#0073#, 16#0069#, 16#007A#, 16#0065#, 16#0020#, 16#006F#, 16#0066#, 16#0020#, 16#0074#, 16#0068#, 16#0065#, 16#0020#, 16#0073#, 16#0074#, 16#0072#, 16#006F#, 16#006B#, 16#0065#, 16#0020#, 16#0064#, 16#0061#, 16#0073#, 16#0068#, 16#0020#, 16#006C#, 16#0065#, 16#006E#, 16#0067#, 16#0074#, 16#0068#, 16#0020#, 16#006C#, 16#0069#, 16#0073#, 16#0074#, 16#0020#, 16#006D#, 16#0075#, 16#0073#, 16#0074#, 16#0020#, 16#0062#, 16#0065#, 16#0020#, 16#0065#, 16#0076#, 16#0065#, 16#006E#, 16#002E#, others => 16#0000#), others => <>); -- "whether the arc sweep is equal to or greater than 180 degrees (the large arc)." MS_008B : aliased Matreshka.Internals.Strings.Shared_String := (Capacity => 87, Unused => 78, Length => 78, Value => (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#0061#, 16#0072#, 16#0063#, 16#0020#, 16#0073#, 16#0077#, 16#0065#, 16#0065#, 16#0070#, 16#0020#, 16#0069#, 16#0073#, 16#0020#, 16#0065#, 16#0071#, 16#0075#, 16#0061#, 16#006C#, 16#0020#, 16#0074#, 16#006F#, 16#0020#, 16#006F#, 16#0072#, 16#0020#, 16#0067#, 16#0072#, 16#0065#, 16#0061#, 16#0074#, 16#0065#, 16#0072#, 16#0020#, 16#0074#, 16#0068#, 16#0061#, 16#006E#, 16#0020#, 16#0031#, 16#0038#, 16#0030#, 16#0020#, 16#0064#, 16#0065#, 16#0067#, 16#0072#, 16#0065#, 16#0065#, 16#0073#, 16#0020#, 16#0028#, 16#0074#, 16#0068#, 16#0065#, 16#0020#, 16#006C#, 16#0061#, 16#0072#, 16#0067#, 16#0065#, 16#0020#, 16#0061#, 16#0072#, 16#0063#, 16#0029#, 16#002E#, others => 16#0000#), others => <>); -- "Translate is a kind of transform that translates (moves) a graphical element by a given delta along the x-y coordinate system." MS_008C : aliased Matreshka.Internals.Strings.Shared_String := (Capacity => 135, Unused => 126, Length => 126, Value => (16#0054#, 16#0072#, 16#0061#, 16#006E#, 16#0073#, 16#006C#, 16#0061#, 16#0074#, 16#0065#, 16#0020#, 16#0069#, 16#0073#, 16#0020#, 16#0061#, 16#0020#, 16#006B#, 16#0069#, 16#006E#, 16#0064#, 16#0020#, 16#006F#, 16#0066#, 16#0020#, 16#0074#, 16#0072#, 16#0061#, 16#006E#, 16#0073#, 16#0066#, 16#006F#, 16#0072#, 16#006D#, 16#0020#, 16#0074#, 16#0068#, 16#0061#, 16#0074#, 16#0020#, 16#0074#, 16#0072#, 16#0061#, 16#006E#, 16#0073#, 16#006C#, 16#0061#, 16#0074#, 16#0065#, 16#0073#, 16#0020#, 16#0028#, 16#006D#, 16#006F#, 16#0076#, 16#0065#, 16#0073#, 16#0029#, 16#0020#, 16#0061#, 16#0020#, 16#0067#, 16#0072#, 16#0061#, 16#0070#, 16#0068#, 16#0069#, 16#0063#, 16#0061#, 16#006C#, 16#0020#, 16#0065#, 16#006C#, 16#0065#, 16#006D#, 16#0065#, 16#006E#, 16#0074#, 16#0020#, 16#0062#, 16#0079#, 16#0020#, 16#0061#, 16#0020#, 16#0067#, 16#0069#, 16#0076#, 16#0065#, 16#006E#, 16#0020#, 16#0064#, 16#0065#, 16#006C#, 16#0074#, 16#0061#, 16#0020#, 16#0061#, 16#006C#, 16#006F#, 16#006E#, 16#0067#, 16#0020#, 16#0074#, 16#0068#, 16#0065#, 16#0020#, 16#0078#, 16#002D#, 16#0079#, 16#0020#, 16#0063#, 16#006F#, 16#006F#, 16#0072#, 16#0064#, 16#0069#, 16#006E#, 16#0061#, 16#0074#, 16#0065#, 16#0020#, 16#0073#, 16#0079#, 16#0073#, 16#0074#, 16#0065#, 16#006D#, 16#002E#, others => 16#0000#), others => <>); -- "valid_offset" MS_008D : aliased Matreshka.Internals.Strings.Shared_String := (Capacity => 15, Unused => 12, Length => 12, Value => (16#0076#, 16#0061#, 16#006C#, 16#0069#, 16#0064#, 16#005F#, 16#006F#, 16#0066#, 16#0066#, 16#0073#, 16#0065#, 16#0074#, others => 16#0000#), others => <>); -- "bounds" MS_008E : aliased Matreshka.Internals.Strings.Shared_String := (Capacity => 7, Unused => 6, Length => 6, Value => (16#0062#, 16#006F#, 16#0075#, 16#006E#, 16#0064#, 16#0073#, others => 16#0000#), others => <>); -- "LinearGradient" MS_008F : aliased Matreshka.Internals.Strings.Shared_String := (Capacity => 15, Unused => 14, Length => 14, Value => (16#004C#, 16#0069#, 16#006E#, 16#0065#, 16#0061#, 16#0072#, 16#0047#, 16#0072#, 16#0061#, 16#0064#, 16#0069#, 16#0065#, 16#006E#, 16#0074#, others => 16#0000#), others => <>); -- "false" MS_0090 : aliased Matreshka.Internals.Strings.Shared_String := (Capacity => 7, Unused => 5, Length => 5, Value => (16#0066#, 16#0061#, 16#006C#, 16#0073#, 16#0065#, others => 16#0000#), others => <>); -- "whether the font used to render a text element has a <b>strike-through</b> style. The default is false." MS_0091 : aliased Matreshka.Internals.Strings.Shared_String := (Capacity => 111, Unused => 103, Length => 103, Value => (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#0066#, 16#006F#, 16#006E#, 16#0074#, 16#0020#, 16#0075#, 16#0073#, 16#0065#, 16#0064#, 16#0020#, 16#0074#, 16#006F#, 16#0020#, 16#0072#, 16#0065#, 16#006E#, 16#0064#, 16#0065#, 16#0072#, 16#0020#, 16#0061#, 16#0020#, 16#0074#, 16#0065#, 16#0078#, 16#0074#, 16#0020#, 16#0065#, 16#006C#, 16#0065#, 16#006D#, 16#0065#, 16#006E#, 16#0074#, 16#0020#, 16#0068#, 16#0061#, 16#0073#, 16#0020#, 16#0061#, 16#0020#, 16#003C#, 16#0062#, 16#003E#, 16#0073#, 16#0074#, 16#0072#, 16#0069#, 16#006B#, 16#0065#, 16#002D#, 16#0074#, 16#0068#, 16#0072#, 16#006F#, 16#0075#, 16#0067#, 16#0068#, 16#003C#, 16#002F#, 16#0062#, 16#003E#, 16#0020#, 16#0073#, 16#0074#, 16#0079#, 16#006C#, 16#0065#, 16#002E#, 16#0020#, 16#0054#, 16#0068#, 16#0065#, 16#0020#, 16#0064#, 16#0065#, 16#0066#, 16#0061#, 16#0075#, 16#006C#, 16#0074#, 16#0020#, 16#0069#, 16#0073#, 16#0020#, 16#0066#, 16#0061#, 16#006C#, 16#0073#, 16#0065#, 16#002E#, others => 16#0000#), others => <>); -- "GradientStop" MS_0092 : aliased Matreshka.Internals.Strings.Shared_String := (Capacity => 15, Unused => 12, Length => 12, Value => (16#0047#, 16#0072#, 16#0061#, 16#0064#, 16#0069#, 16#0065#, 16#006E#, 16#0074#, 16#0053#, 16#0074#, 16#006F#, 16#0070#, others => 16#0000#), others => <>); -- "a real number representing the angle (in degrees) of skew along the x-axis. Both positive (clock-wise) and negative (counter-clock-wise) values are allowed." MS_0093 : aliased Matreshka.Internals.Strings.Shared_String := (Capacity => 167, Unused => 156, Length => 156, Value => (16#0061#, 16#0020#, 16#0072#, 16#0065#, 16#0061#, 16#006C#, 16#0020#, 16#006E#, 16#0075#, 16#006D#, 16#0062#, 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#0069#, 16#006E#, 16#0067#, 16#0020#, 16#0074#, 16#0068#, 16#0065#, 16#0020#, 16#0061#, 16#006E#, 16#0067#, 16#006C#, 16#0065#, 16#0020#, 16#0028#, 16#0069#, 16#006E#, 16#0020#, 16#0064#, 16#0065#, 16#0067#, 16#0072#, 16#0065#, 16#0065#, 16#0073#, 16#0029#, 16#0020#, 16#006F#, 16#0066#, 16#0020#, 16#0073#, 16#006B#, 16#0065#, 16#0077#, 16#0020#, 16#0061#, 16#006C#, 16#006F#, 16#006E#, 16#0067#, 16#0020#, 16#0074#, 16#0068#, 16#0065#, 16#0020#, 16#0078#, 16#002D#, 16#0061#, 16#0078#, 16#0069#, 16#0073#, 16#002E#, 16#0020#, 16#0042#, 16#006F#, 16#0074#, 16#0068#, 16#0020#, 16#0070#, 16#006F#, 16#0073#, 16#0069#, 16#0074#, 16#0069#, 16#0076#, 16#0065#, 16#0020#, 16#0028#, 16#0063#, 16#006C#, 16#006F#, 16#0063#, 16#006B#, 16#002D#, 16#0077#, 16#0069#, 16#0073#, 16#0065#, 16#0029#, 16#0020#, 16#0061#, 16#006E#, 16#0064#, 16#0020#, 16#006E#, 16#0065#, 16#0067#, 16#0061#, 16#0074#, 16#0069#, 16#0076#, 16#0065#, 16#0020#, 16#0028#, 16#0063#, 16#006F#, 16#0075#, 16#006E#, 16#0074#, 16#0065#, 16#0072#, 16#002D#, 16#0063#, 16#006C#, 16#006F#, 16#0063#, 16#006B#, 16#002D#, 16#0077#, 16#0069#, 16#0073#, 16#0065#, 16#0029#, 16#0020#, 16#0076#, 16#0061#, 16#006C#, 16#0075#, 16#0065#, 16#0073#, 16#0020#, 16#0061#, 16#0072#, 16#0065#, 16#0020#, 16#0061#, 16#006C#, 16#006C#, 16#006F#, 16#0077#, 16#0065#, 16#0064#, 16#002E#, others => 16#0000#), others => <>); -- "a reference to the owning element that is clipped by this clip path." MS_0094 : aliased Matreshka.Internals.Strings.Shared_String := (Capacity => 71, Unused => 68, Length => 68, Value => (16#0061#, 16#0020#, 16#0072#, 16#0065#, 16#0066#, 16#0065#, 16#0072#, 16#0065#, 16#006E#, 16#0063#, 16#0065#, 16#0020#, 16#0074#, 16#006F#, 16#0020#, 16#0074#, 16#0068#, 16#0065#, 16#0020#, 16#006F#, 16#0077#, 16#006E#, 16#0069#, 16#006E#, 16#0067#, 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#0063#, 16#006C#, 16#0069#, 16#0070#, 16#0070#, 16#0065#, 16#0064#, 16#0020#, 16#0062#, 16#0079#, 16#0020#, 16#0074#, 16#0068#, 16#0069#, 16#0073#, 16#0020#, 16#0063#, 16#006C#, 16#0069#, 16#0070#, 16#0020#, 16#0070#, 16#0061#, 16#0074#, 16#0068#, 16#002E#, others => 16#0000#), others => <>); -- "fillOpacity" MS_0095 : aliased Matreshka.Internals.Strings.Shared_String := (Capacity => 15, Unused => 11, Length => 11, Value => (16#0066#, 16#0069#, 16#006C#, 16#006C#, 16#004F#, 16#0070#, 16#0061#, 16#0063#, 16#0069#, 16#0074#, 16#0079#, others => 16#0000#), others => <>); -- "Circle" MS_0096 : aliased Matreshka.Internals.Strings.Shared_String := (Capacity => 7, Unused => 6, Length => 6, Value => (16#0043#, 16#0069#, 16#0072#, 16#0063#, 16#006C#, 16#0065#, others => 16#0000#), others => <>); -- "the start control point of the cubic bézier curve." MS_0097 : aliased Matreshka.Internals.Strings.Shared_String := (Capacity => 55, Unused => 50, Length => 50, Value => (16#0074#, 16#0068#, 16#0065#, 16#0020#, 16#0073#, 16#0074#, 16#0061#, 16#0072#, 16#0074#, 16#0020#, 16#0063#, 16#006F#, 16#006E#, 16#0074#, 16#0072#, 16#006F#, 16#006C#, 16#0020#, 16#0070#, 16#006F#, 16#0069#, 16#006E#, 16#0074#, 16#0020#, 16#006F#, 16#0066#, 16#0020#, 16#0074#, 16#0068#, 16#0065#, 16#0020#, 16#0063#, 16#0075#, 16#0062#, 16#0069#, 16#0063#, 16#0020#, 16#0062#, 16#00E9#, 16#007A#, 16#0069#, 16#0065#, 16#0072#, 16#0020#, 16#0063#, 16#0075#, 16#0072#, 16#0076#, 16#0065#, 16#002E#, others => 16#0000#), others => <>); -- "dg" MS_0098 : aliased Matreshka.Internals.Strings.Shared_String := (Capacity => 7, Unused => 2, Length => 2, Value => (16#0064#, 16#0067#, others => 16#0000#), others => <>); -- "a point to draw an elliptical arc to from the current point in the coordinate system." MS_0099 : aliased Matreshka.Internals.Strings.Shared_String := (Capacity => 87, Unused => 85, Length => 85, Value => (16#0061#, 16#0020#, 16#0070#, 16#006F#, 16#0069#, 16#006E#, 16#0074#, 16#0020#, 16#0074#, 16#006F#, 16#0020#, 16#0064#, 16#0072#, 16#0061#, 16#0077#, 16#0020#, 16#0061#, 16#006E#, 16#0020#, 16#0065#, 16#006C#, 16#006C#, 16#0069#, 16#0070#, 16#0074#, 16#0069#, 16#0063#, 16#0061#, 16#006C#, 16#0020#, 16#0061#, 16#0072#, 16#0063#, 16#0020#, 16#0074#, 16#006F#, 16#0020#, 16#0066#, 16#0072#, 16#006F#, 16#006D#, 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#0070#, 16#006F#, 16#0069#, 16#006E#, 16#0074#, 16#0020#, 16#0069#, 16#006E#, 16#0020#, 16#0074#, 16#0068#, 16#0065#, 16#0020#, 16#0063#, 16#006F#, 16#006F#, 16#0072#, 16#0064#, 16#0069#, 16#006E#, 16#0061#, 16#0074#, 16#0065#, 16#0020#, 16#0073#, 16#0079#, 16#0073#, 16#0074#, 16#0065#, 16#006D#, 16#002E#, others => 16#0000#), others => <>); -- "PathCommand is the abstract super type of all commands that participate in specifying a path element." MS_009A : aliased Matreshka.Internals.Strings.Shared_String := (Capacity => 111, Unused => 101, Length => 101, Value => (16#0050#, 16#0061#, 16#0074#, 16#0068#, 16#0043#, 16#006F#, 16#006D#, 16#006D#, 16#0061#, 16#006E#, 16#0064#, 16#0020#, 16#0069#, 16#0073#, 16#0020#, 16#0074#, 16#0068#, 16#0065#, 16#0020#, 16#0061#, 16#0062#, 16#0073#, 16#0074#, 16#0072#, 16#0061#, 16#0063#, 16#0074#, 16#0020#, 16#0073#, 16#0075#, 16#0070#, 16#0065#, 16#0072#, 16#0020#, 16#0074#, 16#0079#, 16#0070#, 16#0065#, 16#0020#, 16#006F#, 16#0066#, 16#0020#, 16#0061#, 16#006C#, 16#006C#, 16#0020#, 16#0063#, 16#006F#, 16#006D#, 16#006D#, 16#0061#, 16#006E#, 16#0064#, 16#0073#, 16#0020#, 16#0074#, 16#0068#, 16#0061#, 16#0074#, 16#0020#, 16#0070#, 16#0061#, 16#0072#, 16#0074#, 16#0069#, 16#0063#, 16#0069#, 16#0070#, 16#0061#, 16#0074#, 16#0065#, 16#0020#, 16#0069#, 16#006E#, 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#0061#, 16#0020#, 16#0070#, 16#0061#, 16#0074#, 16#0068#, 16#0020#, 16#0065#, 16#006C#, 16#0065#, 16#006D#, 16#0065#, 16#006E#, 16#0074#, 16#002E#, others => 16#0000#), others => <>); -- "b" MS_009B : aliased Matreshka.Internals.Strings.Shared_String := (Capacity => 7, Unused => 1, Length => 1, Value => (16#0062#, others => 16#0000#), others => <>); -- "style" MS_009C : aliased Matreshka.Internals.Strings.Shared_String := (Capacity => 7, Unused => 5, Length => 5, Value => (16#0073#, 16#0074#, 16#0079#, 16#006C#, 16#0065#, others => 16#0000#), others => <>); -- "focusY" MS_009D : aliased Matreshka.Internals.Strings.Shared_String := (Capacity => 7, Unused => 6, Length => 6, Value => (16#0066#, 16#006F#, 16#0063#, 16#0075#, 16#0073#, 16#0059#, others => 16#0000#), others => <>); -- "deltaY" MS_009E : aliased Matreshka.Internals.Strings.Shared_String := (Capacity => 7, Unused => 6, Length => 6, Value => (16#0064#, 16#0065#, 16#006C#, 16#0074#, 16#0061#, 16#0059#, others => 16#0000#), others => <>); -- "Canvas is a kind of group that represents the root of containment for all graphical elements that render one diagram." MS_009F : aliased Matreshka.Internals.Strings.Shared_String := (Capacity => 127, Unused => 117, Length => 117, Value => (16#0043#, 16#0061#, 16#006E#, 16#0076#, 16#0061#, 16#0073#, 16#0020#, 16#0069#, 16#0073#, 16#0020#, 16#0061#, 16#0020#, 16#006B#, 16#0069#, 16#006E#, 16#0064#, 16#0020#, 16#006F#, 16#0066#, 16#0020#, 16#0067#, 16#0072#, 16#006F#, 16#0075#, 16#0070#, 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#0074#, 16#0068#, 16#0065#, 16#0020#, 16#0072#, 16#006F#, 16#006F#, 16#0074#, 16#0020#, 16#006F#, 16#0066#, 16#0020#, 16#0063#, 16#006F#, 16#006E#, 16#0074#, 16#0061#, 16#0069#, 16#006E#, 16#006D#, 16#0065#, 16#006E#, 16#0074#, 16#0020#, 16#0066#, 16#006F#, 16#0072#, 16#0020#, 16#0061#, 16#006C#, 16#006C#, 16#0020#, 16#0067#, 16#0072#, 16#0061#, 16#0070#, 16#0068#, 16#0069#, 16#0063#, 16#0061#, 16#006C#, 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#0072#, 16#0065#, 16#006E#, 16#0064#, 16#0065#, 16#0072#, 16#0020#, 16#006F#, 16#006E#, 16#0065#, 16#0020#, 16#0064#, 16#0069#, 16#0061#, 16#0067#, 16#0072#, 16#0061#, 16#006D#, 16#002E#, others => 16#0000#), others => <>); -- "deltaX" MS_00A0 : aliased Matreshka.Internals.Strings.Shared_String := (Capacity => 7, Unused => 6, Length => 6, Value => (16#0064#, 16#0065#, 16#006C#, 16#0074#, 16#0061#, 16#0058#, others => 16#0000#), others => <>); -- "fontColor" MS_00A1 : aliased Matreshka.Internals.Strings.Shared_String := (Capacity => 15, Unused => 9, Length => 9, Value => (16#0066#, 16#006F#, 16#006E#, 16#0074#, 16#0043#, 16#006F#, 16#006C#, 16#006F#, 16#0072#, others => 16#0000#), others => <>); -- "strokeColor" MS_00A2 : aliased Matreshka.Internals.Strings.Shared_String := (Capacity => 15, Unused => 11, Length => 11, Value => (16#0073#, 16#0074#, 16#0072#, 16#006F#, 16#006B#, 16#0065#, 16#0043#, 16#006F#, 16#006C#, 16#006F#, 16#0072#, others => 16#0000#), others => <>); -- "an optional start marker that aligns with the first vertex of the marked element." MS_00A3 : aliased Matreshka.Internals.Strings.Shared_String := (Capacity => 87, Unused => 81, Length => 81, Value => (16#0061#, 16#006E#, 16#0020#, 16#006F#, 16#0070#, 16#0074#, 16#0069#, 16#006F#, 16#006E#, 16#0061#, 16#006C#, 16#0020#, 16#0073#, 16#0074#, 16#0061#, 16#0072#, 16#0074#, 16#0020#, 16#006D#, 16#0061#, 16#0072#, 16#006B#, 16#0065#, 16#0072#, 16#0020#, 16#0074#, 16#0068#, 16#0061#, 16#0074#, 16#0020#, 16#0061#, 16#006C#, 16#0069#, 16#0067#, 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#0066#, 16#0069#, 16#0072#, 16#0073#, 16#0074#, 16#0020#, 16#0076#, 16#0065#, 16#0072#, 16#0074#, 16#0065#, 16#0078#, 16#0020#, 16#006F#, 16#0066#, 16#0020#, 16#0074#, 16#0068#, 16#0065#, 16#0020#, 16#006D#, 16#0061#, 16#0072#, 16#006B#, 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 => <>); -- "sharedStyle" MS_00A4 : aliased Matreshka.Internals.Strings.Shared_String := (Capacity => 15, Unused => 11, Length => 11, Value => (16#0073#, 16#0068#, 16#0061#, 16#0072#, 16#0065#, 16#0064#, 16#0053#, 16#0074#, 16#0079#, 16#006C#, 16#0065#, others => 16#0000#), others => <>); -- "transform" MS_00A5 : aliased Matreshka.Internals.Strings.Shared_String := (Capacity => 15, Unused => 9, Length => 9, Value => (16#0074#, 16#0072#, 16#0061#, 16#006E#, 16#0073#, 16#0066#, 16#006F#, 16#0072#, 16#006D#, others => 16#0000#), others => <>); -- "the group element that owns this graphical element." MS_00A6 : aliased Matreshka.Internals.Strings.Shared_String := (Capacity => 55, Unused => 51, Length => 51, Value => (16#0074#, 16#0068#, 16#0065#, 16#0020#, 16#0067#, 16#0072#, 16#006F#, 16#0075#, 16#0070#, 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#006F#, 16#0077#, 16#006E#, 16#0073#, 16#0020#, 16#0074#, 16#0068#, 16#0069#, 16#0073#, 16#0020#, 16#0067#, 16#0072#, 16#0061#, 16#0070#, 16#0068#, 16#0069#, 16#0063#, 16#0061#, 16#006C#, 16#0020#, 16#0065#, 16#006C#, 16#0065#, 16#006D#, 16#0065#, 16#006E#, 16#0074#, 16#002E#, others => 16#0000#), others => <>); -- "y1" MS_00A7 : aliased Matreshka.Internals.Strings.Shared_String := (Capacity => 7, Unused => 2, Length => 2, Value => (16#0079#, 16#0031#, others => 16#0000#), others => <>); -- "focusX" MS_00A8 : aliased Matreshka.Internals.Strings.Shared_String := (Capacity => 7, Unused => 6, Length => 6, Value => (16#0066#, 16#006F#, 16#0063#, 16#0075#, 16#0073#, 16#0058#, others => 16#0000#), others => <>); -- "fontBold" MS_00A9 : aliased Matreshka.Internals.Strings.Shared_String := (Capacity => 15, Unused => 8, Length => 8, Value => (16#0066#, 16#006F#, 16#006E#, 16#0074#, 16#0042#, 16#006F#, 16#006C#, 16#0064#, others => 16#0000#), others => <>); -- "PathCommand" MS_00AA : aliased Matreshka.Internals.Strings.Shared_String := (Capacity => 15, Unused => 11, Length => 11, Value => (16#0050#, 16#0061#, 16#0074#, 16#0068#, 16#0043#, 16#006F#, 16#006D#, 16#006D#, 16#0061#, 16#006E#, 16#0064#, others => 16#0000#), others => <>); -- "Rotate is a kind of transform that rotates a graphical element by a given angle about a given center point in the x-y coordinate system." MS_00AB : aliased Matreshka.Internals.Strings.Shared_String := (Capacity => 143, Unused => 136, Length => 136, Value => (16#0052#, 16#006F#, 16#0074#, 16#0061#, 16#0074#, 16#0065#, 16#0020#, 16#0069#, 16#0073#, 16#0020#, 16#0061#, 16#0020#, 16#006B#, 16#0069#, 16#006E#, 16#0064#, 16#0020#, 16#006F#, 16#0066#, 16#0020#, 16#0074#, 16#0072#, 16#0061#, 16#006E#, 16#0073#, 16#0066#, 16#006F#, 16#0072#, 16#006D#, 16#0020#, 16#0074#, 16#0068#, 16#0061#, 16#0074#, 16#0020#, 16#0072#, 16#006F#, 16#0074#, 16#0061#, 16#0074#, 16#0065#, 16#0073#, 16#0020#, 16#0061#, 16#0020#, 16#0067#, 16#0072#, 16#0061#, 16#0070#, 16#0068#, 16#0069#, 16#0063#, 16#0061#, 16#006C#, 16#0020#, 16#0065#, 16#006C#, 16#0065#, 16#006D#, 16#0065#, 16#006E#, 16#0074#, 16#0020#, 16#0062#, 16#0079#, 16#0020#, 16#0061#, 16#0020#, 16#0067#, 16#0069#, 16#0076#, 16#0065#, 16#006E#, 16#0020#, 16#0061#, 16#006E#, 16#0067#, 16#006C#, 16#0065#, 16#0020#, 16#0061#, 16#0062#, 16#006F#, 16#0075#, 16#0074#, 16#0020#, 16#0061#, 16#0020#, 16#0067#, 16#0069#, 16#0076#, 16#0065#, 16#006E#, 16#0020#, 16#0063#, 16#0065#, 16#006E#, 16#0074#, 16#0065#, 16#0072#, 16#0020#, 16#0070#, 16#006F#, 16#0069#, 16#006E#, 16#0074#, 16#0020#, 16#0069#, 16#006E#, 16#0020#, 16#0074#, 16#0068#, 16#0065#, 16#0020#, 16#0078#, 16#002D#, 16#0079#, 16#0020#, 16#0063#, 16#006F#, 16#006F#, 16#0072#, 16#0064#, 16#0069#, 16#006E#, 16#0061#, 16#0074#, 16#0065#, 16#0020#, 16#0073#, 16#0079#, 16#0073#, 16#0074#, 16#0065#, 16#006D#, 16#002E#, others => 16#0000#), others => <>); -- "a reference to a fill that is used to paint the background of the canvas itself. A backgroundFill value is exclusive with a backgroundColor value. If both are specified, the backgroundFill value is used. If none is specified, no fill is applied (i.e. the canvas becomes see-through)." MS_00AC : aliased Matreshka.Internals.Strings.Shared_String := (Capacity => 295, Unused => 283, Length => 283, Value => (16#0061#, 16#0020#, 16#0072#, 16#0065#, 16#0066#, 16#0065#, 16#0072#, 16#0065#, 16#006E#, 16#0063#, 16#0065#, 16#0020#, 16#0074#, 16#006F#, 16#0020#, 16#0061#, 16#0020#, 16#0066#, 16#0069#, 16#006C#, 16#006C#, 16#0020#, 16#0074#, 16#0068#, 16#0061#, 16#0074#, 16#0020#, 16#0069#, 16#0073#, 16#0020#, 16#0075#, 16#0073#, 16#0065#, 16#0064#, 16#0020#, 16#0074#, 16#006F#, 16#0020#, 16#0070#, 16#0061#, 16#0069#, 16#006E#, 16#0074#, 16#0020#, 16#0074#, 16#0068#, 16#0065#, 16#0020#, 16#0062#, 16#0061#, 16#0063#, 16#006B#, 16#0067#, 16#0072#, 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#0063#, 16#0061#, 16#006E#, 16#0076#, 16#0061#, 16#0073#, 16#0020#, 16#0069#, 16#0074#, 16#0073#, 16#0065#, 16#006C#, 16#0066#, 16#002E#, 16#0020#, 16#0041#, 16#0020#, 16#0062#, 16#0061#, 16#0063#, 16#006B#, 16#0067#, 16#0072#, 16#006F#, 16#0075#, 16#006E#, 16#0064#, 16#0046#, 16#0069#, 16#006C#, 16#006C#, 16#0020#, 16#0076#, 16#0061#, 16#006C#, 16#0075#, 16#0065#, 16#0020#, 16#0069#, 16#0073#, 16#0020#, 16#0065#, 16#0078#, 16#0063#, 16#006C#, 16#0075#, 16#0073#, 16#0069#, 16#0076#, 16#0065#, 16#0020#, 16#0077#, 16#0069#, 16#0074#, 16#0068#, 16#0020#, 16#0061#, 16#0020#, 16#0062#, 16#0061#, 16#0063#, 16#006B#, 16#0067#, 16#0072#, 16#006F#, 16#0075#, 16#006E#, 16#0064#, 16#0043#, 16#006F#, 16#006C#, 16#006F#, 16#0072#, 16#0020#, 16#0076#, 16#0061#, 16#006C#, 16#0075#, 16#0065#, 16#002E#, 16#0020#, 16#0049#, 16#0066#, 16#0020#, 16#0062#, 16#006F#, 16#0074#, 16#0068#, 16#0020#, 16#0061#, 16#0072#, 16#0065#, 16#0020#, 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#0020#, 16#0062#, 16#0061#, 16#0063#, 16#006B#, 16#0067#, 16#0072#, 16#006F#, 16#0075#, 16#006E#, 16#0064#, 16#0046#, 16#0069#, 16#006C#, 16#006C#, 16#0020#, 16#0076#, 16#0061#, 16#006C#, 16#0075#, 16#0065#, 16#0020#, 16#0069#, 16#0073#, 16#0020#, 16#0075#, 16#0073#, 16#0065#, 16#0064#, 16#002E#, 16#0020#, 16#0049#, 16#0066#, 16#0020#, 16#006E#, 16#006F#, 16#006E#, 16#0065#, 16#0020#, 16#0069#, 16#0073#, 16#0020#, 16#0073#, 16#0070#, 16#0065#, 16#0063#, 16#0069#, 16#0066#, 16#0069#, 16#0065#, 16#0064#, 16#002C#, 16#0020#, 16#006E#, 16#006F#, 16#0020#, 16#0066#, 16#0069#, 16#006C#, 16#006C#, 16#0020#, 16#0069#, 16#0073#, 16#0020#, 16#0061#, 16#0070#, 16#0070#, 16#006C#, 16#0069#, 16#0065#, 16#0064#, 16#0020#, 16#0028#, 16#0069#, 16#002E#, 16#0065#, 16#002E#, 16#0020#, 16#0074#, 16#0068#, 16#0065#, 16#0020#, 16#0063#, 16#0061#, 16#006E#, 16#0076#, 16#0061#, 16#0073#, 16#0020#, 16#0062#, 16#0065#, 16#0063#, 16#006F#, 16#006D#, 16#0065#, 16#0073#, 16#0020#, 16#0073#, 16#0065#, 16#0065#, 16#002D#, 16#0074#, 16#0068#, 16#0072#, 16#006F#, 16#0075#, 16#0067#, 16#0068#, 16#0029#, 16#002E#, others => 16#0000#), others => <>); -- "A_tile_pattern" MS_00AD : aliased Matreshka.Internals.Strings.Shared_String := (Capacity => 15, Unused => 14, Length => 14, Value => (16#0041#, 16#005F#, 16#0074#, 16#0069#, 16#006C#, 16#0065#, 16#005F#, 16#0070#, 16#0061#, 16#0074#, 16#0074#, 16#0065#, 16#0072#, 16#006E#, others => 16#0000#), others => <>); -- "midMarker" MS_00AE : aliased Matreshka.Internals.Strings.Shared_String := (Capacity => 15, Unused => 9, Length => 9, Value => (16#006D#, 16#0069#, 16#0064#, 16#004D#, 16#0061#, 16#0072#, 16#006B#, 16#0065#, 16#0072#, others => 16#0000#), others => <>); -- "fontStrikeThrough" MS_00AF : aliased Matreshka.Internals.Strings.Shared_String := (Capacity => 23, Unused => 17, Length => 17, Value => (16#0066#, 16#006F#, 16#006E#, 16#0074#, 16#0053#, 16#0074#, 16#0072#, 16#0069#, 16#006B#, 16#0065#, 16#0054#, 16#0068#, 16#0072#, 16#006F#, 16#0075#, 16#0067#, 16#0068#, others => 16#0000#), others => <>); -- "whether the font used to render a text element has an <i>italic</i> style. The default is false." MS_00B0 : aliased Matreshka.Internals.Strings.Shared_String := (Capacity => 103, Unused => 96, Length => 96, Value => (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#0066#, 16#006F#, 16#006E#, 16#0074#, 16#0020#, 16#0075#, 16#0073#, 16#0065#, 16#0064#, 16#0020#, 16#0074#, 16#006F#, 16#0020#, 16#0072#, 16#0065#, 16#006E#, 16#0064#, 16#0065#, 16#0072#, 16#0020#, 16#0061#, 16#0020#, 16#0074#, 16#0065#, 16#0078#, 16#0074#, 16#0020#, 16#0065#, 16#006C#, 16#0065#, 16#006D#, 16#0065#, 16#006E#, 16#0074#, 16#0020#, 16#0068#, 16#0061#, 16#0073#, 16#0020#, 16#0061#, 16#006E#, 16#0020#, 16#003C#, 16#0069#, 16#003E#, 16#0069#, 16#0074#, 16#0061#, 16#006C#, 16#0069#, 16#0063#, 16#003C#, 16#002F#, 16#0069#, 16#003E#, 16#0020#, 16#0073#, 16#0074#, 16#0079#, 16#006C#, 16#0065#, 16#002E#, 16#0020#, 16#0054#, 16#0068#, 16#0065#, 16#0020#, 16#0064#, 16#0065#, 16#0066#, 16#0061#, 16#0075#, 16#006C#, 16#0074#, 16#0020#, 16#0069#, 16#0073#, 16#0020#, 16#0066#, 16#0061#, 16#006C#, 16#0073#, 16#0065#, 16#002E#, others => 16#0000#), others => <>); -- "centerY" MS_00B1 : aliased Matreshka.Internals.Strings.Shared_String := (Capacity => 15, Unused => 7, Length => 7, Value => (16#0063#, 16#0065#, 16#006E#, 16#0074#, 16#0065#, 16#0072#, 16#0059#, others => 16#0000#), others => <>); -- "the radius cannot be negative" MS_00B2 : aliased Matreshka.Internals.Strings.Shared_String := (Capacity => 31, Unused => 29, Length => 29, Value => (16#0074#, 16#0068#, 16#0065#, 16#0020#, 16#0072#, 16#0061#, 16#0064#, 16#0069#, 16#0075#, 16#0073#, 16#0020#, 16#0063#, 16#0061#, 16#006E#, 16#006E#, 16#006F#, 16#0074#, 16#0020#, 16#0062#, 16#0065#, 16#0020#, 16#006E#, 16#0065#, 16#0067#, 16#0061#, 16#0074#, 16#0069#, 16#0076#, 16#0065#, others => 16#0000#), others => <>); -- "canvas" MS_00B3 : aliased Matreshka.Internals.Strings.Shared_String := (Capacity => 7, Unused => 6, Length => 6, Value => (16#0063#, 16#0061#, 16#006E#, 16#0076#, 16#0061#, 16#0073#, others => 16#0000#), others => <>); -- "Rectangle is a graphical element that defines a rectangular shape with given bounds. A rectangle may be given rounded corners by setting its corner radius." MS_00B4 : aliased Matreshka.Internals.Strings.Shared_String := (Capacity => 159, Unused => 155, Length => 155, Value => (16#0052#, 16#0065#, 16#0063#, 16#0074#, 16#0061#, 16#006E#, 16#0067#, 16#006C#, 16#0065#, 16#0020#, 16#0069#, 16#0073#, 16#0020#, 16#0061#, 16#0020#, 16#0067#, 16#0072#, 16#0061#, 16#0070#, 16#0068#, 16#0069#, 16#0063#, 16#0061#, 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#0064#, 16#0065#, 16#0066#, 16#0069#, 16#006E#, 16#0065#, 16#0073#, 16#0020#, 16#0061#, 16#0020#, 16#0072#, 16#0065#, 16#0063#, 16#0074#, 16#0061#, 16#006E#, 16#0067#, 16#0075#, 16#006C#, 16#0061#, 16#0072#, 16#0020#, 16#0073#, 16#0068#, 16#0061#, 16#0070#, 16#0065#, 16#0020#, 16#0077#, 16#0069#, 16#0074#, 16#0068#, 16#0020#, 16#0067#, 16#0069#, 16#0076#, 16#0065#, 16#006E#, 16#0020#, 16#0062#, 16#006F#, 16#0075#, 16#006E#, 16#0064#, 16#0073#, 16#002E#, 16#0020#, 16#0041#, 16#0020#, 16#0072#, 16#0065#, 16#0063#, 16#0074#, 16#0061#, 16#006E#, 16#0067#, 16#006C#, 16#0065#, 16#0020#, 16#006D#, 16#0061#, 16#0079#, 16#0020#, 16#0062#, 16#0065#, 16#0020#, 16#0067#, 16#0069#, 16#0076#, 16#0065#, 16#006E#, 16#0020#, 16#0072#, 16#006F#, 16#0075#, 16#006E#, 16#0064#, 16#0065#, 16#0064#, 16#0020#, 16#0063#, 16#006F#, 16#0072#, 16#006E#, 16#0065#, 16#0072#, 16#0073#, 16#0020#, 16#0062#, 16#0079#, 16#0020#, 16#0073#, 16#0065#, 16#0074#, 16#0074#, 16#0069#, 16#006E#, 16#0067#, 16#0020#, 16#0069#, 16#0074#, 16#0073#, 16#0020#, 16#0063#, 16#006F#, 16#0072#, 16#006E#, 16#0065#, 16#0072#, 16#0020#, 16#0072#, 16#0061#, 16#0064#, 16#0069#, 16#0075#, 16#0073#, 16#002E#, others => 16#0000#), others => <>); -- "Transform" MS_00B5 : aliased Matreshka.Internals.Strings.Shared_String := (Capacity => 15, Unused => 9, Length => 9, Value => (16#0054#, 16#0072#, 16#0061#, 16#006E#, 16#0073#, 16#0066#, 16#006F#, 16#0072#, 16#006D#, others => 16#0000#), others => <>); -- "a real number representing a translate delta along the y-axis. Both positive and negative values are allowed." MS_00B6 : aliased Matreshka.Internals.Strings.Shared_String := (Capacity => 119, Unused => 109, Length => 109, Value => (16#0061#, 16#0020#, 16#0072#, 16#0065#, 16#0061#, 16#006C#, 16#0020#, 16#006E#, 16#0075#, 16#006D#, 16#0062#, 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#0069#, 16#006E#, 16#0067#, 16#0020#, 16#0061#, 16#0020#, 16#0074#, 16#0072#, 16#0061#, 16#006E#, 16#0073#, 16#006C#, 16#0061#, 16#0074#, 16#0065#, 16#0020#, 16#0064#, 16#0065#, 16#006C#, 16#0074#, 16#0061#, 16#0020#, 16#0061#, 16#006C#, 16#006F#, 16#006E#, 16#0067#, 16#0020#, 16#0074#, 16#0068#, 16#0065#, 16#0020#, 16#0079#, 16#002D#, 16#0061#, 16#0078#, 16#0069#, 16#0073#, 16#002E#, 16#0020#, 16#0042#, 16#006F#, 16#0074#, 16#0068#, 16#0020#, 16#0070#, 16#006F#, 16#0073#, 16#0069#, 16#0074#, 16#0069#, 16#0076#, 16#0065#, 16#0020#, 16#0061#, 16#006E#, 16#0064#, 16#0020#, 16#006E#, 16#0065#, 16#0067#, 16#0061#, 16#0074#, 16#0069#, 16#0076#, 16#0065#, 16#0020#, 16#0076#, 16#0061#, 16#006C#, 16#0075#, 16#0065#, 16#0073#, 16#0020#, 16#0061#, 16#0072#, 16#0065#, 16#0020#, 16#0061#, 16#006C#, 16#006C#, 16#006F#, 16#0077#, 16#0065#, 16#0064#, 16#002E#, others => 16#0000#), others => <>); -- "a point within the bounds of the marker that aligns exactly with the marked element's vertex." MS_00B7 : aliased Matreshka.Internals.Strings.Shared_String := (Capacity => 95, Unused => 93, Length => 93, Value => (16#0061#, 16#0020#, 16#0070#, 16#006F#, 16#0069#, 16#006E#, 16#0074#, 16#0020#, 16#0077#, 16#0069#, 16#0074#, 16#0068#, 16#0069#, 16#006E#, 16#0020#, 16#0074#, 16#0068#, 16#0065#, 16#0020#, 16#0062#, 16#006F#, 16#0075#, 16#006E#, 16#0064#, 16#0073#, 16#0020#, 16#006F#, 16#0066#, 16#0020#, 16#0074#, 16#0068#, 16#0065#, 16#0020#, 16#006D#, 16#0061#, 16#0072#, 16#006B#, 16#0065#, 16#0072#, 16#0020#, 16#0074#, 16#0068#, 16#0061#, 16#0074#, 16#0020#, 16#0061#, 16#006C#, 16#0069#, 16#0067#, 16#006E#, 16#0073#, 16#0020#, 16#0065#, 16#0078#, 16#0061#, 16#0063#, 16#0074#, 16#006C#, 16#0079#, 16#0020#, 16#0077#, 16#0069#, 16#0074#, 16#0068#, 16#0020#, 16#0074#, 16#0068#, 16#0065#, 16#0020#, 16#006D#, 16#0061#, 16#0072#, 16#006B#, 16#0065#, 16#0064#, 16#0020#, 16#0065#, 16#006C#, 16#0065#, 16#006D#, 16#0065#, 16#006E#, 16#0074#, 16#0027#, 16#0073#, 16#0020#, 16#0076#, 16#0065#, 16#0072#, 16#0074#, 16#0065#, 16#0078#, 16#002E#, others => 16#0000#), others => <>); -- "angleX" MS_00B8 : aliased Matreshka.Internals.Strings.Shared_String := (Capacity => 7, Unused => 6, Length => 6, Value => (16#0061#, 16#006E#, 16#0067#, 16#006C#, 16#0065#, 16#0058#, others => 16#0000#), others => <>); -- "whether the font used to render a text element has an <b>underline</b> style. The default is false." MS_00B9 : aliased Matreshka.Internals.Strings.Shared_String := (Capacity => 103, Unused => 99, Length => 99, Value => (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#0066#, 16#006F#, 16#006E#, 16#0074#, 16#0020#, 16#0075#, 16#0073#, 16#0065#, 16#0064#, 16#0020#, 16#0074#, 16#006F#, 16#0020#, 16#0072#, 16#0065#, 16#006E#, 16#0064#, 16#0065#, 16#0072#, 16#0020#, 16#0061#, 16#0020#, 16#0074#, 16#0065#, 16#0078#, 16#0074#, 16#0020#, 16#0065#, 16#006C#, 16#0065#, 16#006D#, 16#0065#, 16#006E#, 16#0074#, 16#0020#, 16#0068#, 16#0061#, 16#0073#, 16#0020#, 16#0061#, 16#006E#, 16#0020#, 16#003C#, 16#0062#, 16#003E#, 16#0075#, 16#006E#, 16#0064#, 16#0065#, 16#0072#, 16#006C#, 16#0069#, 16#006E#, 16#0065#, 16#003C#, 16#002F#, 16#0062#, 16#003E#, 16#0020#, 16#0073#, 16#0074#, 16#0079#, 16#006C#, 16#0065#, 16#002E#, 16#0020#, 16#0054#, 16#0068#, 16#0065#, 16#0020#, 16#0064#, 16#0065#, 16#0066#, 16#0061#, 16#0075#, 16#006C#, 16#0074#, 16#0020#, 16#0069#, 16#0073#, 16#0020#, 16#0066#, 16#0061#, 16#006C#, 16#0073#, 16#0065#, 16#002E#, others => 16#0000#), others => <>); -- "Line is a marked element that defines a shape consisting of one straight line between two points." MS_00BA : aliased Matreshka.Internals.Strings.Shared_String := (Capacity => 103, Unused => 97, Length => 97, Value => (16#004C#, 16#0069#, 16#006E#, 16#0065#, 16#0020#, 16#0069#, 16#0073#, 16#0020#, 16#0061#, 16#0020#, 16#006D#, 16#0061#, 16#0072#, 16#006B#, 16#0065#, 16#0064#, 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#0064#, 16#0065#, 16#0066#, 16#0069#, 16#006E#, 16#0065#, 16#0073#, 16#0020#, 16#0061#, 16#0020#, 16#0073#, 16#0068#, 16#0061#, 16#0070#, 16#0065#, 16#0020#, 16#0063#, 16#006F#, 16#006E#, 16#0073#, 16#0069#, 16#0073#, 16#0074#, 16#0069#, 16#006E#, 16#0067#, 16#0020#, 16#006F#, 16#0066#, 16#0020#, 16#006F#, 16#006E#, 16#0065#, 16#0020#, 16#0073#, 16#0074#, 16#0072#, 16#0061#, 16#0069#, 16#0067#, 16#0068#, 16#0074#, 16#0020#, 16#006C#, 16#0069#, 16#006E#, 16#0065#, 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#0070#, 16#006F#, 16#0069#, 16#006E#, 16#0074#, 16#0073#, 16#002E#, others => 16#0000#), others => <>); -- "the color to use at this gradient stop." MS_00BB : aliased Matreshka.Internals.Strings.Shared_String := (Capacity => 47, Unused => 39, Length => 39, Value => (16#0074#, 16#0068#, 16#0065#, 16#0020#, 16#0063#, 16#006F#, 16#006C#, 16#006F#, 16#0072#, 16#0020#, 16#0074#, 16#006F#, 16#0020#, 16#0075#, 16#0073#, 16#0065#, 16#0020#, 16#0061#, 16#0074#, 16#0020#, 16#0074#, 16#0068#, 16#0069#, 16#0073#, 16#0020#, 16#0067#, 16#0072#, 16#0061#, 16#0064#, 16#0069#, 16#0065#, 16#006E#, 16#0074#, 16#0020#, 16#0073#, 16#0074#, 16#006F#, 16#0070#, 16#002E#, others => 16#0000#), others => <>); -- "a real number (>=0) that represents the radius of the circle." MS_00BC : aliased Matreshka.Internals.Strings.Shared_String := (Capacity => 63, Unused => 61, Length => 61, Value => (16#0061#, 16#0020#, 16#0072#, 16#0065#, 16#0061#, 16#006C#, 16#0020#, 16#006E#, 16#0075#, 16#006D#, 16#0062#, 16#0065#, 16#0072#, 16#0020#, 16#0028#, 16#003E#, 16#003D#, 16#0030#, 16#0029#, 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#0074#, 16#0068#, 16#0065#, 16#0020#, 16#0072#, 16#0061#, 16#0064#, 16#0069#, 16#0075#, 16#0073#, 16#0020#, 16#006F#, 16#0066#, 16#0020#, 16#0074#, 16#0068#, 16#0065#, 16#0020#, 16#0063#, 16#0069#, 16#0072#, 16#0063#, 16#006C#, 16#0065#, 16#002E#, others => 16#0000#), others => <>); -- "endMarker" MS_00BD : aliased Matreshka.Internals.Strings.Shared_String := (Capacity => 15, Unused => 9, Length => 9, Value => (16#0065#, 16#006E#, 16#0064#, 16#004D#, 16#0061#, 16#0072#, 16#006B#, 16#0065#, 16#0072#, others => 16#0000#), others => <>); -- "center" MS_00BE : aliased Matreshka.Internals.Strings.Shared_String := (Capacity => 7, Unused => 6, Length => 6, Value => (16#0063#, 16#0065#, 16#006E#, 16#0074#, 16#0065#, 16#0072#, others => 16#0000#), others => <>); -- "packagedMarker" MS_00BF : aliased Matreshka.Internals.Strings.Shared_String := (Capacity => 15, Unused => 14, Length => 14, Value => (16#0070#, 16#0061#, 16#0063#, 16#006B#, 16#0061#, 16#0067#, 16#0065#, 16#0064#, 16#004D#, 16#0061#, 16#0072#, 16#006B#, 16#0065#, 16#0072#, others => 16#0000#), others => <>); -- "GradientStop defines a color transition along the distance from a gradient's start to its end offsets." MS_00C0 : aliased Matreshka.Internals.Strings.Shared_String := (Capacity => 111, Unused => 102, Length => 102, Value => (16#0047#, 16#0072#, 16#0061#, 16#0064#, 16#0069#, 16#0065#, 16#006E#, 16#0074#, 16#0053#, 16#0074#, 16#006F#, 16#0070#, 16#0020#, 16#0064#, 16#0065#, 16#0066#, 16#0069#, 16#006E#, 16#0065#, 16#0073#, 16#0020#, 16#0061#, 16#0020#, 16#0063#, 16#006F#, 16#006C#, 16#006F#, 16#0072#, 16#0020#, 16#0074#, 16#0072#, 16#0061#, 16#006E#, 16#0073#, 16#0069#, 16#0074#, 16#0069#, 16#006F#, 16#006E#, 16#0020#, 16#0061#, 16#006C#, 16#006F#, 16#006E#, 16#0067#, 16#0020#, 16#0074#, 16#0068#, 16#0065#, 16#0020#, 16#0064#, 16#0069#, 16#0073#, 16#0074#, 16#0061#, 16#006E#, 16#0063#, 16#0065#, 16#0020#, 16#0066#, 16#0072#, 16#006F#, 16#006D#, 16#0020#, 16#0061#, 16#0020#, 16#0067#, 16#0072#, 16#0061#, 16#0064#, 16#0069#, 16#0065#, 16#006E#, 16#0074#, 16#0027#, 16#0073#, 16#0020#, 16#0073#, 16#0074#, 16#0061#, 16#0072#, 16#0074#, 16#0020#, 16#0074#, 16#006F#, 16#0020#, 16#0069#, 16#0074#, 16#0073#, 16#0020#, 16#0065#, 16#006E#, 16#0064#, 16#0020#, 16#006F#, 16#0066#, 16#0066#, 16#0073#, 16#0065#, 16#0074#, 16#0073#, 16#002E#, others => 16#0000#), others => <>); -- "c" MS_00C1 : aliased Matreshka.Internals.Strings.Shared_String := (Capacity => 7, Unused => 1, Length => 1, Value => (16#0063#, others => 16#0000#), others => <>); -- "endControl" MS_00C2 : aliased Matreshka.Internals.Strings.Shared_String := (Capacity => 15, Unused => 10, Length => 10, Value => (16#0065#, 16#006E#, 16#0064#, 16#0043#, 16#006F#, 16#006E#, 16#0074#, 16#0072#, 16#006F#, 16#006C#, others => 16#0000#), others => <>); -- "a real number (>=0 and >=1) representing a ratio of the graphical element's height that is the y start point of the gradient." MS_00C3 : aliased Matreshka.Internals.Strings.Shared_String := (Capacity => 135, Unused => 125, Length => 125, Value => (16#0061#, 16#0020#, 16#0072#, 16#0065#, 16#0061#, 16#006C#, 16#0020#, 16#006E#, 16#0075#, 16#006D#, 16#0062#, 16#0065#, 16#0072#, 16#0020#, 16#0028#, 16#003E#, 16#003D#, 16#0030#, 16#0020#, 16#0061#, 16#006E#, 16#0064#, 16#0020#, 16#003E#, 16#003D#, 16#0031#, 16#0029#, 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#0061#, 16#0020#, 16#0072#, 16#0061#, 16#0074#, 16#0069#, 16#006F#, 16#0020#, 16#006F#, 16#0066#, 16#0020#, 16#0074#, 16#0068#, 16#0065#, 16#0020#, 16#0067#, 16#0072#, 16#0061#, 16#0070#, 16#0068#, 16#0069#, 16#0063#, 16#0061#, 16#006C#, 16#0020#, 16#0065#, 16#006C#, 16#0065#, 16#006D#, 16#0065#, 16#006E#, 16#0074#, 16#0027#, 16#0073#, 16#0020#, 16#0068#, 16#0065#, 16#0069#, 16#0067#, 16#0068#, 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#0079#, 16#0020#, 16#0073#, 16#0074#, 16#0061#, 16#0072#, 16#0074#, 16#0020#, 16#0070#, 16#006F#, 16#0069#, 16#006E#, 16#0074#, 16#0020#, 16#006F#, 16#0066#, 16#0020#, 16#0074#, 16#0068#, 16#0065#, 16#0020#, 16#0067#, 16#0072#, 16#0061#, 16#0064#, 16#0069#, 16#0065#, 16#006E#, 16#0074#, 16#002E#, others => 16#0000#), others => <>); -- "the f value of the transform matrix." MS_00C4 : aliased Matreshka.Internals.Strings.Shared_String := (Capacity => 39, Unused => 36, Length => 36, Value => (16#0074#, 16#0068#, 16#0065#, 16#0020#, 16#0066#, 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#0074#, 16#0072#, 16#0061#, 16#006E#, 16#0073#, 16#0066#, 16#006F#, 16#0072#, 16#006D#, 16#0020#, 16#006D#, 16#0061#, 16#0074#, 16#0072#, 16#0069#, 16#0078#, 16#002E#, others => 16#0000#), others => <>); -- "a color that is used to paint the enclosed regions of graphical element. A fillColor value is exclusive with a fill value. If both are specified, the fill value is used. If none is specified, no fill is applied (i.e. the element becomes see-through)." MS_00C5 : aliased Matreshka.Internals.Strings.Shared_String := (Capacity => 263, Unused => 250, Length => 250, Value => (16#0061#, 16#0020#, 16#0063#, 16#006F#, 16#006C#, 16#006F#, 16#0072#, 16#0020#, 16#0074#, 16#0068#, 16#0061#, 16#0074#, 16#0020#, 16#0069#, 16#0073#, 16#0020#, 16#0075#, 16#0073#, 16#0065#, 16#0064#, 16#0020#, 16#0074#, 16#006F#, 16#0020#, 16#0070#, 16#0061#, 16#0069#, 16#006E#, 16#0074#, 16#0020#, 16#0074#, 16#0068#, 16#0065#, 16#0020#, 16#0065#, 16#006E#, 16#0063#, 16#006C#, 16#006F#, 16#0073#, 16#0065#, 16#0064#, 16#0020#, 16#0072#, 16#0065#, 16#0067#, 16#0069#, 16#006F#, 16#006E#, 16#0073#, 16#0020#, 16#006F#, 16#0066#, 16#0020#, 16#0067#, 16#0072#, 16#0061#, 16#0070#, 16#0068#, 16#0069#, 16#0063#, 16#0061#, 16#006C#, 16#0020#, 16#0065#, 16#006C#, 16#0065#, 16#006D#, 16#0065#, 16#006E#, 16#0074#, 16#002E#, 16#0020#, 16#0041#, 16#0020#, 16#0066#, 16#0069#, 16#006C#, 16#006C#, 16#0043#, 16#006F#, 16#006C#, 16#006F#, 16#0072#, 16#0020#, 16#0076#, 16#0061#, 16#006C#, 16#0075#, 16#0065#, 16#0020#, 16#0069#, 16#0073#, 16#0020#, 16#0065#, 16#0078#, 16#0063#, 16#006C#, 16#0075#, 16#0073#, 16#0069#, 16#0076#, 16#0065#, 16#0020#, 16#0077#, 16#0069#, 16#0074#, 16#0068#, 16#0020#, 16#0061#, 16#0020#, 16#0066#, 16#0069#, 16#006C#, 16#006C#, 16#0020#, 16#0076#, 16#0061#, 16#006C#, 16#0075#, 16#0065#, 16#002E#, 16#0020#, 16#0049#, 16#0066#, 16#0020#, 16#0062#, 16#006F#, 16#0074#, 16#0068#, 16#0020#, 16#0061#, 16#0072#, 16#0065#, 16#0020#, 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#0020#, 16#0066#, 16#0069#, 16#006C#, 16#006C#, 16#0020#, 16#0076#, 16#0061#, 16#006C#, 16#0075#, 16#0065#, 16#0020#, 16#0069#, 16#0073#, 16#0020#, 16#0075#, 16#0073#, 16#0065#, 16#0064#, 16#002E#, 16#0020#, 16#0049#, 16#0066#, 16#0020#, 16#006E#, 16#006F#, 16#006E#, 16#0065#, 16#0020#, 16#0069#, 16#0073#, 16#0020#, 16#0073#, 16#0070#, 16#0065#, 16#0063#, 16#0069#, 16#0066#, 16#0069#, 16#0065#, 16#0064#, 16#002C#, 16#0020#, 16#006E#, 16#006F#, 16#0020#, 16#0066#, 16#0069#, 16#006C#, 16#006C#, 16#0020#, 16#0069#, 16#0073#, 16#0020#, 16#0061#, 16#0070#, 16#0070#, 16#006C#, 16#0069#, 16#0065#, 16#0064#, 16#0020#, 16#0028#, 16#0069#, 16#002E#, 16#0065#, 16#002E#, 16#0020#, 16#0074#, 16#0068#, 16#0065#, 16#0020#, 16#0065#, 16#006C#, 16#0065#, 16#006D#, 16#0065#, 16#006E#, 16#0074#, 16#0020#, 16#0062#, 16#0065#, 16#0063#, 16#006F#, 16#006D#, 16#0065#, 16#0073#, 16#0020#, 16#0073#, 16#0065#, 16#0065#, 16#002D#, 16#0074#, 16#0068#, 16#0072#, 16#006F#, 16#0075#, 16#0067#, 16#0068#, 16#0029#, 16#002E#, others => 16#0000#), others => <>); -- "Circle is a graphical element that defines a circular shape with a given center point and a radius." MS_00C6 : aliased Matreshka.Internals.Strings.Shared_String := (Capacity => 103, Unused => 99, Length => 99, Value => (16#0043#, 16#0069#, 16#0072#, 16#0063#, 16#006C#, 16#0065#, 16#0020#, 16#0069#, 16#0073#, 16#0020#, 16#0061#, 16#0020#, 16#0067#, 16#0072#, 16#0061#, 16#0070#, 16#0068#, 16#0069#, 16#0063#, 16#0061#, 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#0064#, 16#0065#, 16#0066#, 16#0069#, 16#006E#, 16#0065#, 16#0073#, 16#0020#, 16#0061#, 16#0020#, 16#0063#, 16#0069#, 16#0072#, 16#0063#, 16#0075#, 16#006C#, 16#0061#, 16#0072#, 16#0020#, 16#0073#, 16#0068#, 16#0061#, 16#0070#, 16#0065#, 16#0020#, 16#0077#, 16#0069#, 16#0074#, 16#0068#, 16#0020#, 16#0061#, 16#0020#, 16#0067#, 16#0069#, 16#0076#, 16#0065#, 16#006E#, 16#0020#, 16#0063#, 16#0065#, 16#006E#, 16#0074#, 16#0065#, 16#0072#, 16#0020#, 16#0070#, 16#006F#, 16#0069#, 16#006E#, 16#0074#, 16#0020#, 16#0061#, 16#006E#, 16#0064#, 16#0020#, 16#0061#, 16#0020#, 16#0072#, 16#0061#, 16#0064#, 16#0069#, 16#0075#, 16#0073#, 16#002E#, others => 16#0000#), others => <>); -- "non-negative-scale" MS_00C7 : aliased Matreshka.Internals.Strings.Shared_String := (Capacity => 23, Unused => 18, Length => 18, Value => (16#006E#, 16#006F#, 16#006E#, 16#002D#, 16#006E#, 16#0065#, 16#0067#, 16#0061#, 16#0074#, 16#0069#, 16#0076#, 16#0065#, 16#002D#, 16#0073#, 16#0063#, 16#0061#, 16#006C#, 16#0065#, others => 16#0000#), others => <>); -- "e" MS_00C8 : aliased Matreshka.Internals.Strings.Shared_String := (Capacity => 7, Unused => 1, Length => 1, Value => (16#0065#, others => 16#0000#), others => <>); -- "Translate" MS_00C9 : aliased Matreshka.Internals.Strings.Shared_String := (Capacity => 15, Unused => 9, Length => 9, Value => (16#0054#, 16#0072#, 16#0061#, 16#006E#, 16#0073#, 16#006C#, 16#0061#, 16#0074#, 16#0065#, others => 16#0000#), others => <>); -- "MarkedElement" MS_00CA : aliased Matreshka.Internals.Strings.Shared_String := (Capacity => 15, Unused => 13, Length => 13, Value => (16#004D#, 16#0061#, 16#0072#, 16#006B#, 16#0065#, 16#0064#, 16#0045#, 16#006C#, 16#0065#, 16#006D#, 16#0065#, 16#006E#, 16#0074#, others => 16#0000#), others => <>); -- "a real number (>=0 and >=1) representing a ratio of the graphical element's width that is the x focus point of the gradient." MS_00CB : aliased Matreshka.Internals.Strings.Shared_String := (Capacity => 127, Unused => 124, Length => 124, Value => (16#0061#, 16#0020#, 16#0072#, 16#0065#, 16#0061#, 16#006C#, 16#0020#, 16#006E#, 16#0075#, 16#006D#, 16#0062#, 16#0065#, 16#0072#, 16#0020#, 16#0028#, 16#003E#, 16#003D#, 16#0030#, 16#0020#, 16#0061#, 16#006E#, 16#0064#, 16#0020#, 16#003E#, 16#003D#, 16#0031#, 16#0029#, 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#0061#, 16#0020#, 16#0072#, 16#0061#, 16#0074#, 16#0069#, 16#006F#, 16#0020#, 16#006F#, 16#0066#, 16#0020#, 16#0074#, 16#0068#, 16#0065#, 16#0020#, 16#0067#, 16#0072#, 16#0061#, 16#0070#, 16#0068#, 16#0069#, 16#0063#, 16#0061#, 16#006C#, 16#0020#, 16#0065#, 16#006C#, 16#0065#, 16#006D#, 16#0065#, 16#006E#, 16#0074#, 16#0027#, 16#0073#, 16#0020#, 16#0077#, 16#0069#, 16#0064#, 16#0074#, 16#0068#, 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#0078#, 16#0020#, 16#0066#, 16#006F#, 16#0063#, 16#0075#, 16#0073#, 16#0020#, 16#0070#, 16#006F#, 16#0069#, 16#006E#, 16#0074#, 16#0020#, 16#006F#, 16#0066#, 16#0020#, 16#0074#, 16#0068#, 16#0065#, 16#0020#, 16#0067#, 16#0072#, 16#0061#, 16#0064#, 16#0069#, 16#0065#, 16#006E#, 16#0074#, 16#002E#, others => 16#0000#), others => <>); -- "Style contains formatting properties that affect the appearance or style of graphical elements." MS_00CC : aliased Matreshka.Internals.Strings.Shared_String := (Capacity => 103, Unused => 95, Length => 95, Value => (16#0053#, 16#0074#, 16#0079#, 16#006C#, 16#0065#, 16#0020#, 16#0063#, 16#006F#, 16#006E#, 16#0074#, 16#0061#, 16#0069#, 16#006E#, 16#0073#, 16#0020#, 16#0066#, 16#006F#, 16#0072#, 16#006D#, 16#0061#, 16#0074#, 16#0074#, 16#0069#, 16#006E#, 16#0067#, 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#0066#, 16#0066#, 16#0065#, 16#0063#, 16#0074#, 16#0020#, 16#0074#, 16#0068#, 16#0065#, 16#0020#, 16#0061#, 16#0070#, 16#0070#, 16#0065#, 16#0061#, 16#0072#, 16#0061#, 16#006E#, 16#0063#, 16#0065#, 16#0020#, 16#006F#, 16#0072#, 16#0020#, 16#0073#, 16#0074#, 16#0079#, 16#006C#, 16#0065#, 16#0020#, 16#006F#, 16#0066#, 16#0020#, 16#0067#, 16#0072#, 16#0061#, 16#0070#, 16#0068#, 16#0069#, 16#0063#, 16#0061#, 16#006C#, 16#0020#, 16#0065#, 16#006C#, 16#0065#, 16#006D#, 16#0065#, 16#006E#, 16#0074#, 16#0073#, 16#002E#, others => 16#0000#), others => <>); -- "pattern" MS_00CD : aliased Matreshka.Internals.Strings.Shared_String := (Capacity => 15, Unused => 7, Length => 7, Value => (16#0070#, 16#0061#, 16#0074#, 16#0074#, 16#0065#, 16#0072#, 16#006E#, others => 16#0000#), others => <>); -- "a list of 2 or more points making up the polyline." MS_00CE : aliased Matreshka.Internals.Strings.Shared_String := (Capacity => 55, Unused => 50, Length => 50, Value => (16#0061#, 16#0020#, 16#006C#, 16#0069#, 16#0073#, 16#0074#, 16#0020#, 16#006F#, 16#0066#, 16#0020#, 16#0032#, 16#0020#, 16#006F#, 16#0072#, 16#0020#, 16#006D#, 16#006F#, 16#0072#, 16#0065#, 16#0020#, 16#0070#, 16#006F#, 16#0069#, 16#006E#, 16#0074#, 16#0073#, 16#0020#, 16#006D#, 16#0061#, 16#006B#, 16#0069#, 16#006E#, 16#0067#, 16#0020#, 16#0075#, 16#0070#, 16#0020#, 16#0074#, 16#0068#, 16#0065#, 16#0020#, 16#0070#, 16#006F#, 16#006C#, 16#0079#, 16#006C#, 16#0069#, 16#006E#, 16#0065#, 16#002E#, others => 16#0000#), others => <>); -- "a point to draw a cubic bézier curve to from the current point in the coordinate system." MS_00CF : aliased Matreshka.Internals.Strings.Shared_String := (Capacity => 95, Unused => 88, Length => 88, Value => (16#0061#, 16#0020#, 16#0070#, 16#006F#, 16#0069#, 16#006E#, 16#0074#, 16#0020#, 16#0074#, 16#006F#, 16#0020#, 16#0064#, 16#0072#, 16#0061#, 16#0077#, 16#0020#, 16#0061#, 16#0020#, 16#0063#, 16#0075#, 16#0062#, 16#0069#, 16#0063#, 16#0020#, 16#0062#, 16#00E9#, 16#007A#, 16#0069#, 16#0065#, 16#0072#, 16#0020#, 16#0063#, 16#0075#, 16#0072#, 16#0076#, 16#0065#, 16#0020#, 16#0074#, 16#006F#, 16#0020#, 16#0066#, 16#0072#, 16#006F#, 16#006D#, 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#0070#, 16#006F#, 16#0069#, 16#006E#, 16#0074#, 16#0020#, 16#0069#, 16#006E#, 16#0020#, 16#0074#, 16#0068#, 16#0065#, 16#0020#, 16#0063#, 16#006F#, 16#006F#, 16#0072#, 16#0064#, 16#0069#, 16#006E#, 16#0061#, 16#0074#, 16#0065#, 16#0020#, 16#0073#, 16#0079#, 16#0073#, 16#0074#, 16#0065#, 16#006D#, 16#002E#, others => 16#0000#), others => <>); -- "EllipticalArcTo" MS_00D0 : aliased Matreshka.Internals.Strings.Shared_String := (Capacity => 23, Unused => 15, Length => 15, Value => (16#0045#, 16#006C#, 16#006C#, 16#0069#, 16#0070#, 16#0074#, 16#0069#, 16#0063#, 16#0061#, 16#006C#, 16#0041#, 16#0072#, 16#0063#, 16#0054#, 16#006F#, others => 16#0000#), others => <>); -- "the a value of the transform matrix." MS_00D1 : aliased Matreshka.Internals.Strings.Shared_String := (Capacity => 39, Unused => 36, Length => 36, Value => (16#0074#, 16#0068#, 16#0065#, 16#0020#, 16#0061#, 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#0074#, 16#0072#, 16#0061#, 16#006E#, 16#0073#, 16#0066#, 16#006F#, 16#0072#, 16#006D#, 16#0020#, 16#006D#, 16#0061#, 16#0074#, 16#0072#, 16#0069#, 16#0078#, 16#002E#, others => 16#0000#), others => <>); -- "the list of graphical elements that are members of (owned by) this group." MS_00D2 : aliased Matreshka.Internals.Strings.Shared_String := (Capacity => 79, Unused => 73, Length => 73, Value => (16#0074#, 16#0068#, 16#0065#, 16#0020#, 16#006C#, 16#0069#, 16#0073#, 16#0074#, 16#0020#, 16#006F#, 16#0066#, 16#0020#, 16#0067#, 16#0072#, 16#0061#, 16#0070#, 16#0068#, 16#0069#, 16#0063#, 16#0061#, 16#006C#, 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#006D#, 16#0065#, 16#006D#, 16#0062#, 16#0065#, 16#0072#, 16#0073#, 16#0020#, 16#006F#, 16#0066#, 16#0020#, 16#0028#, 16#006F#, 16#0077#, 16#006E#, 16#0065#, 16#0064#, 16#0020#, 16#0062#, 16#0079#, 16#0029#, 16#0020#, 16#0074#, 16#0068#, 16#0069#, 16#0073#, 16#0020#, 16#0067#, 16#0072#, 16#006F#, 16#0075#, 16#0070#, 16#002E#, others => 16#0000#), others => <>); -- "ClosePath is a kind of path command that ends the current subpath and causes an automatic straight line to be drawn from the current point to the initial point of the current subpath." MS_00D3 : aliased Matreshka.Internals.Strings.Shared_String := (Capacity => 191, Unused => 183, Length => 183, Value => (16#0043#, 16#006C#, 16#006F#, 16#0073#, 16#0065#, 16#0050#, 16#0061#, 16#0074#, 16#0068#, 16#0020#, 16#0069#, 16#0073#, 16#0020#, 16#0061#, 16#0020#, 16#006B#, 16#0069#, 16#006E#, 16#0064#, 16#0020#, 16#006F#, 16#0066#, 16#0020#, 16#0070#, 16#0061#, 16#0074#, 16#0068#, 16#0020#, 16#0063#, 16#006F#, 16#006D#, 16#006D#, 16#0061#, 16#006E#, 16#0064#, 16#0020#, 16#0074#, 16#0068#, 16#0061#, 16#0074#, 16#0020#, 16#0065#, 16#006E#, 16#0064#, 16#0073#, 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#0073#, 16#0075#, 16#0062#, 16#0070#, 16#0061#, 16#0074#, 16#0068#, 16#0020#, 16#0061#, 16#006E#, 16#0064#, 16#0020#, 16#0063#, 16#0061#, 16#0075#, 16#0073#, 16#0065#, 16#0073#, 16#0020#, 16#0061#, 16#006E#, 16#0020#, 16#0061#, 16#0075#, 16#0074#, 16#006F#, 16#006D#, 16#0061#, 16#0074#, 16#0069#, 16#0063#, 16#0020#, 16#0073#, 16#0074#, 16#0072#, 16#0061#, 16#0069#, 16#0067#, 16#0068#, 16#0074#, 16#0020#, 16#006C#, 16#0069#, 16#006E#, 16#0065#, 16#0020#, 16#0074#, 16#006F#, 16#0020#, 16#0062#, 16#0065#, 16#0020#, 16#0064#, 16#0072#, 16#0061#, 16#0077#, 16#006E#, 16#0020#, 16#0066#, 16#0072#, 16#006F#, 16#006D#, 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#0070#, 16#006F#, 16#0069#, 16#006E#, 16#0074#, 16#0020#, 16#0074#, 16#006F#, 16#0020#, 16#0074#, 16#0068#, 16#0065#, 16#0020#, 16#0069#, 16#006E#, 16#0069#, 16#0074#, 16#0069#, 16#0061#, 16#006C#, 16#0020#, 16#0070#, 16#006F#, 16#0069#, 16#006E#, 16#0074#, 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#0020#, 16#0073#, 16#0075#, 16#0062#, 16#0070#, 16#0061#, 16#0074#, 16#0068#, 16#002E#, others => 16#0000#), others => <>); -- "rotation" MS_00D4 : aliased Matreshka.Internals.Strings.Shared_String := (Capacity => 15, Unused => 8, Length => 8, Value => (16#0072#, 16#006F#, 16#0074#, 16#0061#, 16#0074#, 16#0069#, 16#006F#, 16#006E#, others => 16#0000#), others => <>); -- "valid_font_size" MS_00D5 : aliased Matreshka.Internals.Strings.Shared_String := (Capacity => 23, Unused => 15, Length => 15, Value => (16#0076#, 16#0061#, 16#006C#, 16#0069#, 16#0064#, 16#005F#, 16#0066#, 16#006F#, 16#006E#, 16#0074#, 16#005F#, 16#0073#, 16#0069#, 16#007A#, 16#0065#, others => 16#0000#), others => <>); -- "a reference to the canvas that owns this marker." MS_00D6 : aliased Matreshka.Internals.Strings.Shared_String := (Capacity => 55, Unused => 48, Length => 48, Value => (16#0061#, 16#0020#, 16#0072#, 16#0065#, 16#0066#, 16#0065#, 16#0072#, 16#0065#, 16#006E#, 16#0063#, 16#0065#, 16#0020#, 16#0074#, 16#006F#, 16#0020#, 16#0074#, 16#0068#, 16#0065#, 16#0020#, 16#0063#, 16#0061#, 16#006E#, 16#0076#, 16#0061#, 16#0073#, 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#006D#, 16#0061#, 16#0072#, 16#006B#, 16#0065#, 16#0072#, 16#002E#, others => 16#0000#), others => <>); -- "Pattern" MS_00D7 : aliased Matreshka.Internals.Strings.Shared_String := (Capacity => 15, Unused => 7, Length => 7, Value => (16#0050#, 16#0061#, 16#0074#, 16#0074#, 16#0065#, 16#0072#, 16#006E#, others => 16#0000#), others => <>); -- "ClipPath is a kind of group whose members collectively define a painting mask for its referencing graphical elements." MS_00D8 : aliased Matreshka.Internals.Strings.Shared_String := (Capacity => 127, Unused => 117, Length => 117, Value => (16#0043#, 16#006C#, 16#0069#, 16#0070#, 16#0050#, 16#0061#, 16#0074#, 16#0068#, 16#0020#, 16#0069#, 16#0073#, 16#0020#, 16#0061#, 16#0020#, 16#006B#, 16#0069#, 16#006E#, 16#0064#, 16#0020#, 16#006F#, 16#0066#, 16#0020#, 16#0067#, 16#0072#, 16#006F#, 16#0075#, 16#0070#, 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#0073#, 16#0020#, 16#0063#, 16#006F#, 16#006C#, 16#006C#, 16#0065#, 16#0063#, 16#0074#, 16#0069#, 16#0076#, 16#0065#, 16#006C#, 16#0079#, 16#0020#, 16#0064#, 16#0065#, 16#0066#, 16#0069#, 16#006E#, 16#0065#, 16#0020#, 16#0061#, 16#0020#, 16#0070#, 16#0061#, 16#0069#, 16#006E#, 16#0074#, 16#0069#, 16#006E#, 16#0067#, 16#0020#, 16#006D#, 16#0061#, 16#0073#, 16#006B#, 16#0020#, 16#0066#, 16#006F#, 16#0072#, 16#0020#, 16#0069#, 16#0074#, 16#0073#, 16#0020#, 16#0072#, 16#0065#, 16#0066#, 16#0065#, 16#0072#, 16#0065#, 16#006E#, 16#0063#, 16#0069#, 16#006E#, 16#0067#, 16#0020#, 16#0067#, 16#0072#, 16#0061#, 16#0070#, 16#0068#, 16#0069#, 16#0063#, 16#0061#, 16#006C#, 16#0020#, 16#0065#, 16#006C#, 16#0065#, 16#006D#, 16#0065#, 16#006E#, 16#0074#, 16#0073#, 16#002E#, others => 16#0000#), others => <>); -- "control" MS_00D9 : aliased Matreshka.Internals.Strings.Shared_String := (Capacity => 15, Unused => 7, Length => 7, Value => (16#0063#, 16#006F#, 16#006E#, 16#0074#, 16#0072#, 16#006F#, 16#006C#, others => 16#0000#), others => <>); -- "the center point of the ellipse in the x-y coordinate system." MS_00DA : aliased Matreshka.Internals.Strings.Shared_String := (Capacity => 63, Unused => 61, Length => 61, Value => (16#0074#, 16#0068#, 16#0065#, 16#0020#, 16#0063#, 16#0065#, 16#006E#, 16#0074#, 16#0065#, 16#0072#, 16#0020#, 16#0070#, 16#006F#, 16#0069#, 16#006E#, 16#0074#, 16#0020#, 16#006F#, 16#0066#, 16#0020#, 16#0074#, 16#0068#, 16#0065#, 16#0020#, 16#0065#, 16#006C#, 16#006C#, 16#0069#, 16#0070#, 16#0073#, 16#0065#, 16#0020#, 16#0069#, 16#006E#, 16#0020#, 16#0074#, 16#0068#, 16#0065#, 16#0020#, 16#0078#, 16#002D#, 16#0079#, 16#0020#, 16#0063#, 16#006F#, 16#006F#, 16#0072#, 16#0064#, 16#0069#, 16#006E#, 16#0061#, 16#0074#, 16#0065#, 16#0020#, 16#0073#, 16#0079#, 16#0073#, 16#0074#, 16#0065#, 16#006D#, 16#002E#, others => 16#0000#), others => <>); -- "the end control point of the cubic bézier curve." MS_00DB : aliased Matreshka.Internals.Strings.Shared_String := (Capacity => 55, Unused => 48, Length => 48, Value => (16#0074#, 16#0068#, 16#0065#, 16#0020#, 16#0065#, 16#006E#, 16#0064#, 16#0020#, 16#0063#, 16#006F#, 16#006E#, 16#0074#, 16#0072#, 16#006F#, 16#006C#, 16#0020#, 16#0070#, 16#006F#, 16#0069#, 16#006E#, 16#0074#, 16#0020#, 16#006F#, 16#0066#, 16#0020#, 16#0074#, 16#0068#, 16#0065#, 16#0020#, 16#0063#, 16#0075#, 16#0062#, 16#0069#, 16#0063#, 16#0020#, 16#0062#, 16#00E9#, 16#007A#, 16#0069#, 16#0065#, 16#0072#, 16#0020#, 16#0063#, 16#0075#, 16#0072#, 16#0076#, 16#0065#, 16#002E#, others => 16#0000#), others => <>); -- "Marker is a kind of group that is used as a decoration (e.g. an arrowhead) for the vertices of a marked graphical element." MS_00DC : aliased Matreshka.Internals.Strings.Shared_String := (Capacity => 127, Unused => 122, Length => 122, Value => (16#004D#, 16#0061#, 16#0072#, 16#006B#, 16#0065#, 16#0072#, 16#0020#, 16#0069#, 16#0073#, 16#0020#, 16#0061#, 16#0020#, 16#006B#, 16#0069#, 16#006E#, 16#0064#, 16#0020#, 16#006F#, 16#0066#, 16#0020#, 16#0067#, 16#0072#, 16#006F#, 16#0075#, 16#0070#, 16#0020#, 16#0074#, 16#0068#, 16#0061#, 16#0074#, 16#0020#, 16#0069#, 16#0073#, 16#0020#, 16#0075#, 16#0073#, 16#0065#, 16#0064#, 16#0020#, 16#0061#, 16#0073#, 16#0020#, 16#0061#, 16#0020#, 16#0064#, 16#0065#, 16#0063#, 16#006F#, 16#0072#, 16#0061#, 16#0074#, 16#0069#, 16#006F#, 16#006E#, 16#0020#, 16#0028#, 16#0065#, 16#002E#, 16#0067#, 16#002E#, 16#0020#, 16#0061#, 16#006E#, 16#0020#, 16#0061#, 16#0072#, 16#0072#, 16#006F#, 16#0077#, 16#0068#, 16#0065#, 16#0061#, 16#0064#, 16#0029#, 16#0020#, 16#0066#, 16#006F#, 16#0072#, 16#0020#, 16#0074#, 16#0068#, 16#0065#, 16#0020#, 16#0076#, 16#0065#, 16#0072#, 16#0074#, 16#0069#, 16#0063#, 16#0065#, 16#0073#, 16#0020#, 16#006F#, 16#0066#, 16#0020#, 16#0061#, 16#0020#, 16#006D#, 16#0061#, 16#0072#, 16#006B#, 16#0065#, 16#0064#, 16#0020#, 16#0067#, 16#0072#, 16#0061#, 16#0070#, 16#0068#, 16#0069#, 16#0063#, 16#0061#, 16#006C#, 16#0020#, 16#0065#, 16#006C#, 16#0065#, 16#006D#, 16#0065#, 16#006E#, 16#0074#, 16#002E#, others => 16#0000#), others => <>); -- "the d value of the transform matrix." MS_00DD : aliased Matreshka.Internals.Strings.Shared_String := (Capacity => 39, Unused => 36, Length => 36, Value => (16#0074#, 16#0068#, 16#0065#, 16#0020#, 16#0064#, 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#0074#, 16#0072#, 16#0061#, 16#006E#, 16#0073#, 16#0066#, 16#006F#, 16#0072#, 16#006D#, 16#0020#, 16#006D#, 16#0061#, 16#0074#, 16#0072#, 16#0069#, 16#0078#, 16#002E#, others => 16#0000#), others => <>); -- "Style" MS_00DE : aliased Matreshka.Internals.Strings.Shared_String := (Capacity => 7, Unused => 5, Length => 5, Value => (16#0053#, 16#0074#, 16#0079#, 16#006C#, 16#0065#, others => 16#0000#), others => <>); -- "a real number (>=0) representing the width of the stroke used to paint the outline of a graphical element. A value of 0 specifies no stroke is painted. The default is 1." MS_00DF : aliased Matreshka.Internals.Strings.Shared_String := (Capacity => 175, Unused => 169, Length => 169, Value => (16#0061#, 16#0020#, 16#0072#, 16#0065#, 16#0061#, 16#006C#, 16#0020#, 16#006E#, 16#0075#, 16#006D#, 16#0062#, 16#0065#, 16#0072#, 16#0020#, 16#0028#, 16#003E#, 16#003D#, 16#0030#, 16#0029#, 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#0077#, 16#0069#, 16#0064#, 16#0074#, 16#0068#, 16#0020#, 16#006F#, 16#0066#, 16#0020#, 16#0074#, 16#0068#, 16#0065#, 16#0020#, 16#0073#, 16#0074#, 16#0072#, 16#006F#, 16#006B#, 16#0065#, 16#0020#, 16#0075#, 16#0073#, 16#0065#, 16#0064#, 16#0020#, 16#0074#, 16#006F#, 16#0020#, 16#0070#, 16#0061#, 16#0069#, 16#006E#, 16#0074#, 16#0020#, 16#0074#, 16#0068#, 16#0065#, 16#0020#, 16#006F#, 16#0075#, 16#0074#, 16#006C#, 16#0069#, 16#006E#, 16#0065#, 16#0020#, 16#006F#, 16#0066#, 16#0020#, 16#0061#, 16#0020#, 16#0067#, 16#0072#, 16#0061#, 16#0070#, 16#0068#, 16#0069#, 16#0063#, 16#0061#, 16#006C#, 16#0020#, 16#0065#, 16#006C#, 16#0065#, 16#006D#, 16#0065#, 16#006E#, 16#0074#, 16#002E#, 16#0020#, 16#0041#, 16#0020#, 16#0076#, 16#0061#, 16#006C#, 16#0075#, 16#0065#, 16#0020#, 16#006F#, 16#0066#, 16#0020#, 16#0030#, 16#0020#, 16#0073#, 16#0070#, 16#0065#, 16#0063#, 16#0069#, 16#0066#, 16#0069#, 16#0065#, 16#0073#, 16#0020#, 16#006E#, 16#006F#, 16#0020#, 16#0073#, 16#0074#, 16#0072#, 16#006F#, 16#006B#, 16#0065#, 16#0020#, 16#0069#, 16#0073#, 16#0020#, 16#0070#, 16#0061#, 16#0069#, 16#006E#, 16#0074#, 16#0065#, 16#0064#, 16#002E#, 16#0020#, 16#0054#, 16#0068#, 16#0065#, 16#0020#, 16#0064#, 16#0065#, 16#0066#, 16#0061#, 16#0075#, 16#006C#, 16#0074#, 16#0020#, 16#0069#, 16#0073#, 16#0020#, 16#0031#, 16#002E#, others => 16#0000#), others => <>); -- "the size of the marker" MS_00E0 : aliased Matreshka.Internals.Strings.Shared_String := (Capacity => 23, Unused => 22, Length => 22, Value => (16#0074#, 16#0068#, 16#0065#, 16#0020#, 16#0073#, 16#0069#, 16#007A#, 16#0065#, 16#0020#, 16#006F#, 16#0066#, 16#0020#, 16#0074#, 16#0068#, 16#0065#, 16#0020#, 16#006D#, 16#0061#, 16#0072#, 16#006B#, 16#0065#, 16#0072#, others => 16#0000#), others => <>); -- "alignment" MS_00E1 : aliased Matreshka.Internals.Strings.Shared_String := (Capacity => 15, Unused => 9, Length => 9, Value => (16#0061#, 16#006C#, 16#0069#, 16#0067#, 16#006E#, 16#006D#, 16#0065#, 16#006E#, 16#0074#, others => 16#0000#), others => <>); -- "Polygon" MS_00E2 : aliased Matreshka.Internals.Strings.Shared_String := (Capacity => 15, Unused => 7, Length => 7, Value => (16#0050#, 16#006F#, 16#006C#, 16#0079#, 16#0067#, 16#006F#, 16#006E#, others => 16#0000#), others => <>); -- "an optional mid marker that aligns with all vertices of the marked element except the first and the last." MS_00E3 : aliased Matreshka.Internals.Strings.Shared_String := (Capacity => 111, Unused => 105, Length => 105, Value => (16#0061#, 16#006E#, 16#0020#, 16#006F#, 16#0070#, 16#0074#, 16#0069#, 16#006F#, 16#006E#, 16#0061#, 16#006C#, 16#0020#, 16#006D#, 16#0069#, 16#0064#, 16#0020#, 16#006D#, 16#0061#, 16#0072#, 16#006B#, 16#0065#, 16#0072#, 16#0020#, 16#0074#, 16#0068#, 16#0061#, 16#0074#, 16#0020#, 16#0061#, 16#006C#, 16#0069#, 16#0067#, 16#006E#, 16#0073#, 16#0020#, 16#0077#, 16#0069#, 16#0074#, 16#0068#, 16#0020#, 16#0061#, 16#006C#, 16#006C#, 16#0020#, 16#0076#, 16#0065#, 16#0072#, 16#0074#, 16#0069#, 16#0063#, 16#0065#, 16#0073#, 16#0020#, 16#006F#, 16#0066#, 16#0020#, 16#0074#, 16#0068#, 16#0065#, 16#0020#, 16#006D#, 16#0061#, 16#0072#, 16#006B#, 16#0065#, 16#0064#, 16#0020#, 16#0065#, 16#006C#, 16#0065#, 16#006D#, 16#0065#, 16#006E#, 16#0074#, 16#0020#, 16#0065#, 16#0078#, 16#0063#, 16#0065#, 16#0070#, 16#0074#, 16#0020#, 16#0074#, 16#0068#, 16#0065#, 16#0020#, 16#0066#, 16#0069#, 16#0072#, 16#0073#, 16#0074#, 16#0020#, 16#0061#, 16#006E#, 16#0064#, 16#0020#, 16#0074#, 16#0068#, 16#0065#, 16#0020#, 16#006C#, 16#0061#, 16#0073#, 16#0074#, 16#002E#, others => 16#0000#), others => <>); -- "the stroke width is non-negative" MS_00E4 : aliased Matreshka.Internals.Strings.Shared_String := (Capacity => 39, Unused => 32, Length => 32, Value => (16#0074#, 16#0068#, 16#0065#, 16#0020#, 16#0073#, 16#0074#, 16#0072#, 16#006F#, 16#006B#, 16#0065#, 16#0020#, 16#0077#, 16#0069#, 16#0064#, 16#0074#, 16#0068#, 16#0020#, 16#0069#, 16#0073#, 16#0020#, 16#006E#, 16#006F#, 16#006E#, 16#002D#, 16#006E#, 16#0065#, 16#0067#, 16#0061#, 16#0074#, 16#0069#, 16#0076#, 16#0065#, others => 16#0000#), others => <>); -- "Ellipse" MS_00E5 : aliased Matreshka.Internals.Strings.Shared_String := (Capacity => 15, Unused => 7, Length => 7, Value => (16#0045#, 16#006C#, 16#006C#, 16#0069#, 16#0070#, 16#0073#, 16#0065#, others => 16#0000#), others => <>); -- "GraphicalElement is the abstract superclass of all graphical elements that can be nested in a canvas." MS_00E6 : aliased Matreshka.Internals.Strings.Shared_String := (Capacity => 111, Unused => 101, Length => 101, Value => (16#0047#, 16#0072#, 16#0061#, 16#0070#, 16#0068#, 16#0069#, 16#0063#, 16#0061#, 16#006C#, 16#0045#, 16#006C#, 16#0065#, 16#006D#, 16#0065#, 16#006E#, 16#0074#, 16#0020#, 16#0069#, 16#0073#, 16#0020#, 16#0074#, 16#0068#, 16#0065#, 16#0020#, 16#0061#, 16#0062#, 16#0073#, 16#0074#, 16#0072#, 16#0061#, 16#0063#, 16#0074#, 16#0020#, 16#0073#, 16#0075#, 16#0070#, 16#0065#, 16#0072#, 16#0063#, 16#006C#, 16#0061#, 16#0073#, 16#0073#, 16#0020#, 16#006F#, 16#0066#, 16#0020#, 16#0061#, 16#006C#, 16#006C#, 16#0020#, 16#0067#, 16#0072#, 16#0061#, 16#0070#, 16#0068#, 16#0069#, 16#0063#, 16#0061#, 16#006C#, 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#0063#, 16#0061#, 16#006E#, 16#0020#, 16#0062#, 16#0065#, 16#0020#, 16#006E#, 16#0065#, 16#0073#, 16#0074#, 16#0065#, 16#0064#, 16#0020#, 16#0069#, 16#006E#, 16#0020#, 16#0061#, 16#0020#, 16#0063#, 16#0061#, 16#006E#, 16#0076#, 16#0061#, 16#0073#, 16#002E#, others => 16#0000#), others => <>); -- "the bounds within which the image is rendered." MS_00E7 : aliased Matreshka.Internals.Strings.Shared_String := (Capacity => 47, Unused => 46, Length => 46, Value => (16#0074#, 16#0068#, 16#0065#, 16#0020#, 16#0062#, 16#006F#, 16#0075#, 16#006E#, 16#0064#, 16#0073#, 16#0020#, 16#0077#, 16#0069#, 16#0074#, 16#0068#, 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#0069#, 16#006D#, 16#0061#, 16#0067#, 16#0065#, 16#0020#, 16#0069#, 16#0073#, 16#0020#, 16#0072#, 16#0065#, 16#006E#, 16#0064#, 16#0065#, 16#0072#, 16#0065#, 16#0064#, 16#002E#, others => 16#0000#), others => <>); -- "an optional reference to a clip path element that masks the painting of this graphical element." MS_00E8 : aliased Matreshka.Internals.Strings.Shared_String := (Capacity => 103, Unused => 95, Length => 95, Value => (16#0061#, 16#006E#, 16#0020#, 16#006F#, 16#0070#, 16#0074#, 16#0069#, 16#006F#, 16#006E#, 16#0061#, 16#006C#, 16#0020#, 16#0072#, 16#0065#, 16#0066#, 16#0065#, 16#0072#, 16#0065#, 16#006E#, 16#0063#, 16#0065#, 16#0020#, 16#0074#, 16#006F#, 16#0020#, 16#0061#, 16#0020#, 16#0063#, 16#006C#, 16#0069#, 16#0070#, 16#0020#, 16#0070#, 16#0061#, 16#0074#, 16#0068#, 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#006D#, 16#0061#, 16#0073#, 16#006B#, 16#0073#, 16#0020#, 16#0074#, 16#0068#, 16#0065#, 16#0020#, 16#0070#, 16#0061#, 16#0069#, 16#006E#, 16#0074#, 16#0069#, 16#006E#, 16#0067#, 16#0020#, 16#006F#, 16#0066#, 16#0020#, 16#0074#, 16#0068#, 16#0069#, 16#0073#, 16#0020#, 16#0067#, 16#0072#, 16#0061#, 16#0070#, 16#0068#, 16#0069#, 16#0063#, 16#0061#, 16#006C#, 16#0020#, 16#0065#, 16#006C#, 16#0065#, 16#006D#, 16#0065#, 16#006E#, 16#0074#, 16#002E#, others => 16#0000#), others => <>); -- "org.omg.xmi.nsPrefix" MS_00E9 : aliased Matreshka.Internals.Strings.Shared_String := (Capacity => 23, Unused => 20, Length => 20, Value => (16#006F#, 16#0072#, 16#0067#, 16#002E#, 16#006F#, 16#006D#, 16#0067#, 16#002E#, 16#0078#, 16#006D#, 16#0069#, 16#002E#, 16#006E#, 16#0073#, 16#0050#, 16#0072#, 16#0065#, 16#0066#, 16#0069#, 16#0078#, others => 16#0000#), others => <>); -- "a real number (>=0 and >=1) representing a ratio of the graphical element's width that is the x center point of the gradient." MS_00EA : aliased Matreshka.Internals.Strings.Shared_String := (Capacity => 135, Unused => 125, Length => 125, Value => (16#0061#, 16#0020#, 16#0072#, 16#0065#, 16#0061#, 16#006C#, 16#0020#, 16#006E#, 16#0075#, 16#006D#, 16#0062#, 16#0065#, 16#0072#, 16#0020#, 16#0028#, 16#003E#, 16#003D#, 16#0030#, 16#0020#, 16#0061#, 16#006E#, 16#0064#, 16#0020#, 16#003E#, 16#003D#, 16#0031#, 16#0029#, 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#0061#, 16#0020#, 16#0072#, 16#0061#, 16#0074#, 16#0069#, 16#006F#, 16#0020#, 16#006F#, 16#0066#, 16#0020#, 16#0074#, 16#0068#, 16#0065#, 16#0020#, 16#0067#, 16#0072#, 16#0061#, 16#0070#, 16#0068#, 16#0069#, 16#0063#, 16#0061#, 16#006C#, 16#0020#, 16#0065#, 16#006C#, 16#0065#, 16#006D#, 16#0065#, 16#006E#, 16#0074#, 16#0027#, 16#0073#, 16#0020#, 16#0077#, 16#0069#, 16#0064#, 16#0074#, 16#0068#, 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#0078#, 16#0020#, 16#0063#, 16#0065#, 16#006E#, 16#0074#, 16#0065#, 16#0072#, 16#0020#, 16#0070#, 16#006F#, 16#0069#, 16#006E#, 16#0074#, 16#0020#, 16#006F#, 16#0066#, 16#0020#, 16#0074#, 16#0068#, 16#0065#, 16#0020#, 16#0067#, 16#0072#, 16#0061#, 16#0064#, 16#0069#, 16#0065#, 16#006E#, 16#0074#, 16#002E#, others => 16#0000#), others => <>); -- "A_localStyle_styledElement" MS_00EB : aliased Matreshka.Internals.Strings.Shared_String := (Capacity => 31, Unused => 26, Length => 26, Value => (16#0041#, 16#005F#, 16#006C#, 16#006F#, 16#0063#, 16#0061#, 16#006C#, 16#0053#, 16#0074#, 16#0079#, 16#006C#, 16#0065#, 16#005F#, 16#0073#, 16#0074#, 16#0079#, 16#006C#, 16#0065#, 16#0064#, 16#0045#, 16#006C#, 16#0065#, 16#006D#, 16#0065#, 16#006E#, 16#0074#, others => 16#0000#), others => <>); -- "color" MS_00EC : aliased Matreshka.Internals.Strings.Shared_String := (Capacity => 7, Unused => 5, Length => 5, Value => (16#0063#, 16#006F#, 16#006C#, 16#006F#, 16#0072#, others => 16#0000#), others => <>); -- "factorX" MS_00ED : aliased Matreshka.Internals.Strings.Shared_String := (Capacity => 15, Unused => 7, Length => 7, Value => (16#0066#, 16#0061#, 16#0063#, 16#0074#, 16#006F#, 16#0072#, 16#0058#, others => 16#0000#), others => <>); -- "data" MS_00EE : aliased Matreshka.Internals.Strings.Shared_String := (Capacity => 7, Unused => 4, Length => 4, Value => (16#0064#, 16#0061#, 16#0074#, 16#0061#, others => 16#0000#), others => <>); -- "radius" MS_00EF : aliased Matreshka.Internals.Strings.Shared_String := (Capacity => 7, Unused => 6, Length => 6, Value => (16#0072#, 16#0061#, 16#0064#, 16#0069#, 16#0075#, 16#0073#, others => 16#0000#), others => <>); -- "angleY" MS_00F0 : aliased Matreshka.Internals.Strings.Shared_String := (Capacity => 7, Unused => 6, Length => 6, Value => (16#0061#, 16#006E#, 16#0067#, 16#006C#, 16#0065#, 16#0059#, others => 16#0000#), others => <>); -- "valid_opacity" MS_00F1 : aliased Matreshka.Internals.Strings.Shared_String := (Capacity => 15, Unused => 13, Length => 13, Value => (16#0076#, 16#0061#, 16#006C#, 16#0069#, 16#0064#, 16#005F#, 16#006F#, 16#0070#, 16#0061#, 16#0063#, 16#0069#, 16#0074#, 16#0079#, others => 16#0000#), others => <>); -- "Text is a graphical element that defines a shape that renders a character string within a bounding box." MS_00F2 : aliased Matreshka.Internals.Strings.Shared_String := (Capacity => 111, Unused => 103, Length => 103, Value => (16#0054#, 16#0065#, 16#0078#, 16#0074#, 16#0020#, 16#0069#, 16#0073#, 16#0020#, 16#0061#, 16#0020#, 16#0067#, 16#0072#, 16#0061#, 16#0070#, 16#0068#, 16#0069#, 16#0063#, 16#0061#, 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#0064#, 16#0065#, 16#0066#, 16#0069#, 16#006E#, 16#0065#, 16#0073#, 16#0020#, 16#0061#, 16#0020#, 16#0073#, 16#0068#, 16#0061#, 16#0070#, 16#0065#, 16#0020#, 16#0074#, 16#0068#, 16#0061#, 16#0074#, 16#0020#, 16#0072#, 16#0065#, 16#006E#, 16#0064#, 16#0065#, 16#0072#, 16#0073#, 16#0020#, 16#0061#, 16#0020#, 16#0063#, 16#0068#, 16#0061#, 16#0072#, 16#0061#, 16#0063#, 16#0074#, 16#0065#, 16#0072#, 16#0020#, 16#0073#, 16#0074#, 16#0072#, 16#0069#, 16#006E#, 16#0067#, 16#0020#, 16#0077#, 16#0069#, 16#0074#, 16#0068#, 16#0069#, 16#006E#, 16#0020#, 16#0061#, 16#0020#, 16#0062#, 16#006F#, 16#0075#, 16#006E#, 16#0064#, 16#0069#, 16#006E#, 16#0067#, 16#0020#, 16#0062#, 16#006F#, 16#0078#, 16#002E#, others => 16#0000#), others => <>); -- "GraphicalElement" MS_00F3 : aliased Matreshka.Internals.Strings.Shared_String := (Capacity => 23, Unused => 16, Length => 16, Value => (16#0047#, 16#0072#, 16#0061#, 16#0070#, 16#0068#, 16#0069#, 16#0063#, 16#0061#, 16#006C#, 16#0045#, 16#006C#, 16#0065#, 16#006D#, 16#0065#, 16#006E#, 16#0074#, others => 16#0000#), others => <>); -- "source" MS_00F4 : 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 => <>); -- "styledElement" MS_00F5 : aliased Matreshka.Internals.Strings.Shared_String := (Capacity => 15, Unused => 13, Length => 13, Value => (16#0073#, 16#0074#, 16#0079#, 16#006C#, 16#0065#, 16#0064#, 16#0045#, 16#006C#, 16#0065#, 16#006D#, 16#0065#, 16#006E#, 16#0074#, others => 16#0000#), others => <>); -- "whether the font used to render a text element has a <b>bold</b> style. The default is false." MS_00F6 : aliased Matreshka.Internals.Strings.Shared_String := (Capacity => 95, Unused => 93, Length => 93, Value => (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#0066#, 16#006F#, 16#006E#, 16#0074#, 16#0020#, 16#0075#, 16#0073#, 16#0065#, 16#0064#, 16#0020#, 16#0074#, 16#006F#, 16#0020#, 16#0072#, 16#0065#, 16#006E#, 16#0064#, 16#0065#, 16#0072#, 16#0020#, 16#0061#, 16#0020#, 16#0074#, 16#0065#, 16#0078#, 16#0074#, 16#0020#, 16#0065#, 16#006C#, 16#0065#, 16#006D#, 16#0065#, 16#006E#, 16#0074#, 16#0020#, 16#0068#, 16#0061#, 16#0073#, 16#0020#, 16#0061#, 16#0020#, 16#003C#, 16#0062#, 16#003E#, 16#0062#, 16#006F#, 16#006C#, 16#0064#, 16#003C#, 16#002F#, 16#0062#, 16#003E#, 16#0020#, 16#0073#, 16#0074#, 16#0079#, 16#006C#, 16#0065#, 16#002E#, 16#0020#, 16#0054#, 16#0068#, 16#0065#, 16#0020#, 16#0064#, 16#0065#, 16#0066#, 16#0061#, 16#0075#, 16#006C#, 16#0074#, 16#0020#, 16#0069#, 16#0073#, 16#0020#, 16#0066#, 16#0061#, 16#006C#, 16#0073#, 16#0065#, 16#002E#, others => 16#0000#), others => <>); -- "http://www.omg.org/spec/DD/20110901/DG" MS_00F7 : aliased Matreshka.Internals.Strings.Shared_String := (Capacity => 47, Unused => 38, Length => 38, Value => (16#0068#, 16#0074#, 16#0074#, 16#0070#, 16#003A#, 16#002F#, 16#002F#, 16#0077#, 16#0077#, 16#0077#, 16#002E#, 16#006F#, 16#006D#, 16#0067#, 16#002E#, 16#006F#, 16#0072#, 16#0067#, 16#002F#, 16#0073#, 16#0070#, 16#0065#, 16#0063#, 16#002F#, 16#0044#, 16#0044#, 16#002F#, 16#0032#, 16#0030#, 16#0031#, 16#0031#, 16#0030#, 16#0039#, 16#0030#, 16#0031#, 16#002F#, 16#0044#, 16#0047#, others => 16#0000#), others => <>); -- "DG" MS_00F8 : aliased Matreshka.Internals.Strings.Shared_String := (Capacity => 7, Unused => 2, Length => 2, Value => (16#0044#, 16#0047#, others => 16#0000#), others => <>); -- "offset" MS_00F9 : aliased Matreshka.Internals.Strings.Shared_String := (Capacity => 7, Unused => 6, Length => 6, Value => (16#006F#, 16#0066#, 16#0066#, 16#0073#, 16#0065#, 16#0074#, others => 16#0000#), others => <>); -- "a real number (>=0) representing a scale factor along the x-axis." MS_00FA : aliased Matreshka.Internals.Strings.Shared_String := (Capacity => 71, Unused => 65, Length => 65, Value => (16#0061#, 16#0020#, 16#0072#, 16#0065#, 16#0061#, 16#006C#, 16#0020#, 16#006E#, 16#0075#, 16#006D#, 16#0062#, 16#0065#, 16#0072#, 16#0020#, 16#0028#, 16#003E#, 16#003D#, 16#0030#, 16#0029#, 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#0061#, 16#0020#, 16#0073#, 16#0063#, 16#0061#, 16#006C#, 16#0065#, 16#0020#, 16#0066#, 16#0061#, 16#0063#, 16#0074#, 16#006F#, 16#0072#, 16#0020#, 16#0061#, 16#006C#, 16#006F#, 16#006E#, 16#0067#, 16#0020#, 16#0074#, 16#0068#, 16#0065#, 16#0020#, 16#0078#, 16#002D#, 16#0061#, 16#0078#, 16#0069#, 16#0073#, 16#002E#, others => 16#0000#), others => <>); -- "the starting point of the line in the x-y coordinate system." MS_00FB : aliased Matreshka.Internals.Strings.Shared_String := (Capacity => 63, Unused => 60, Length => 60, Value => (16#0074#, 16#0068#, 16#0065#, 16#0020#, 16#0073#, 16#0074#, 16#0061#, 16#0072#, 16#0074#, 16#0069#, 16#006E#, 16#0067#, 16#0020#, 16#0070#, 16#006F#, 16#0069#, 16#006E#, 16#0074#, 16#0020#, 16#006F#, 16#0066#, 16#0020#, 16#0074#, 16#0068#, 16#0065#, 16#0020#, 16#006C#, 16#0069#, 16#006E#, 16#0065#, 16#0020#, 16#0069#, 16#006E#, 16#0020#, 16#0074#, 16#0068#, 16#0065#, 16#0020#, 16#0078#, 16#002D#, 16#0079#, 16#0020#, 16#0063#, 16#006F#, 16#006F#, 16#0072#, 16#0064#, 16#0069#, 16#006E#, 16#0061#, 16#0074#, 16#0065#, 16#0020#, 16#0073#, 16#0079#, 16#0073#, 16#0074#, 16#0065#, 16#006D#, 16#002E#, others => 16#0000#), others => <>); -- "a real number (>=0 and >=1) representing a ratio of the graphical element's width that is the x start point of the gradient." MS_00FC : aliased Matreshka.Internals.Strings.Shared_String := (Capacity => 127, Unused => 124, Length => 124, Value => (16#0061#, 16#0020#, 16#0072#, 16#0065#, 16#0061#, 16#006C#, 16#0020#, 16#006E#, 16#0075#, 16#006D#, 16#0062#, 16#0065#, 16#0072#, 16#0020#, 16#0028#, 16#003E#, 16#003D#, 16#0030#, 16#0020#, 16#0061#, 16#006E#, 16#0064#, 16#0020#, 16#003E#, 16#003D#, 16#0031#, 16#0029#, 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#0061#, 16#0020#, 16#0072#, 16#0061#, 16#0074#, 16#0069#, 16#006F#, 16#0020#, 16#006F#, 16#0066#, 16#0020#, 16#0074#, 16#0068#, 16#0065#, 16#0020#, 16#0067#, 16#0072#, 16#0061#, 16#0070#, 16#0068#, 16#0069#, 16#0063#, 16#0061#, 16#006C#, 16#0020#, 16#0065#, 16#006C#, 16#0065#, 16#006D#, 16#0065#, 16#006E#, 16#0074#, 16#0027#, 16#0073#, 16#0020#, 16#0077#, 16#0069#, 16#0064#, 16#0074#, 16#0068#, 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#0078#, 16#0020#, 16#0073#, 16#0074#, 16#0061#, 16#0072#, 16#0074#, 16#0020#, 16#0070#, 16#006F#, 16#0069#, 16#006E#, 16#0074#, 16#0020#, 16#006F#, 16#0066#, 16#0020#, 16#0074#, 16#0068#, 16#0065#, 16#0020#, 16#0067#, 16#0072#, 16#0061#, 16#0064#, 16#0069#, 16#0065#, 16#006E#, 16#0074#, 16#002E#, others => 16#0000#), others => <>); -- "isSweep" MS_00FD : aliased Matreshka.Internals.Strings.Shared_String := (Capacity => 15, Unused => 7, Length => 7, Value => (16#0069#, 16#0073#, 16#0053#, 16#0077#, 16#0065#, 16#0065#, 16#0070#, others => 16#0000#), others => <>); -- "LineTo is a kind of path command that draw a straight line from the current point to a new point." MS_00FE : aliased Matreshka.Internals.Strings.Shared_String := (Capacity => 103, Unused => 97, Length => 97, Value => (16#004C#, 16#0069#, 16#006E#, 16#0065#, 16#0054#, 16#006F#, 16#0020#, 16#0069#, 16#0073#, 16#0020#, 16#0061#, 16#0020#, 16#006B#, 16#0069#, 16#006E#, 16#0064#, 16#0020#, 16#006F#, 16#0066#, 16#0020#, 16#0070#, 16#0061#, 16#0074#, 16#0068#, 16#0020#, 16#0063#, 16#006F#, 16#006D#, 16#006D#, 16#0061#, 16#006E#, 16#0064#, 16#0020#, 16#0074#, 16#0068#, 16#0061#, 16#0074#, 16#0020#, 16#0064#, 16#0072#, 16#0061#, 16#0077#, 16#0020#, 16#0061#, 16#0020#, 16#0073#, 16#0074#, 16#0072#, 16#0061#, 16#0069#, 16#0067#, 16#0068#, 16#0074#, 16#0020#, 16#006C#, 16#0069#, 16#006E#, 16#0065#, 16#0020#, 16#0066#, 16#0072#, 16#006F#, 16#006D#, 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#0070#, 16#006F#, 16#0069#, 16#006E#, 16#0074#, 16#0020#, 16#0074#, 16#006F#, 16#0020#, 16#0061#, 16#0020#, 16#006E#, 16#0065#, 16#0077#, 16#0020#, 16#0070#, 16#006F#, 16#0069#, 16#006E#, 16#0074#, 16#002E#, others => 16#0000#), others => <>); -- "point" MS_00FF : aliased Matreshka.Internals.Strings.Shared_String := (Capacity => 7, Unused => 5, Length => 5, Value => (16#0070#, 16#006F#, 16#0069#, 16#006E#, 16#0074#, others => 16#0000#), others => <>); end AMF.Internals.Tables.DG_String_Data_00;
redparavoz/ada-wiki
Ada
4,337
adb
----------------------------------------------------------------------- -- wiki-streams-html-text_io -- Wiki HTML output stream on Ada Text_IO -- Copyright (C) 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. ----------------------------------------------------------------------- package body Wiki.Streams.Html.Text_IO is -- Close the current XML entity if an entity was started procedure Close_Current (Stream : in out Html_File_Output_Stream'Class); -- ------------------------------ -- Close the current XML entity if an entity was started -- ------------------------------ procedure Close_Current (Stream : in out Html_File_Output_Stream'Class) is begin if Stream.Close_Start then Stream.Write ('>'); Stream.Close_Start := False; end if; end Close_Current; -- ------------------------------ -- Write the string to the stream. -- ------------------------------ procedure Write_String (Stream : in out Html_File_Output_Stream'Class; Content : in String) is begin for I in Content'Range loop Stream.Write (Wiki.Strings.To_WChar (Content (I))); end loop; end Write_String; -- ------------------------------ -- Write an XML attribute within an XML element. -- The attribute value is escaped according to the XML escape rules. -- ------------------------------ overriding procedure Write_Wide_Attribute (Stream : in out Html_File_Output_Stream; Name : in String; Content : in Wiki.Strings.UString) is begin if Stream.Close_Start then Html.Write_Escape_Attribute (Stream, Name, Wiki.Strings.To_WString (Content)); end if; end Write_Wide_Attribute; -- ------------------------------ -- Write an XML attribute within an XML element. -- The attribute value is escaped according to the XML escape rules. -- ------------------------------ overriding procedure Write_Wide_Attribute (Stream : in out Html_File_Output_Stream; Name : in String; Content : in Wide_Wide_String) is begin if Stream.Close_Start then Stream.Write_Escape_Attribute (Name, Content); end if; end Write_Wide_Attribute; -- ------------------------------ -- Start an XML element with the given name. -- ------------------------------ overriding procedure Start_Element (Stream : in out Html_File_Output_Stream; Name : in String) is begin Close_Current (Stream); Stream.Write ('<'); Stream.Write_String (Name); Stream.Close_Start := True; end Start_Element; -- ------------------------------ -- Closes an XML element of the given name. -- ------------------------------ overriding procedure End_Element (Stream : in out Html_File_Output_Stream; Name : in String) is begin if Stream.Close_Start then Stream.Write (" />"); Stream.Close_Start := False; else Close_Current (Stream); Stream.Write ("</"); Stream.Write_String (Name); Stream.Write ('>'); end if; end End_Element; -- ------------------------------ -- Write a text escaping any character as necessary. -- ------------------------------ overriding procedure Write_Wide_Text (Stream : in out Html_File_Output_Stream; Content : in Wiki.Strings.WString) is begin Close_Current (Stream); Stream.Write_Escape (Content); end Write_Wide_Text; end Wiki.Streams.Html.Text_IO;
reznikmm/matreshka
Ada
1,001
adb
package body Matreshka.Opts.options is not overriding procedure Set_Name (Self : in out Option; Name : in Universal_String) is begin Self.Name := Name; end Set_Name; not overriding procedure Set_Long (Self : in out Option; Long : in Universal_String) is begin Self.Long_Option := Long; end Set_Long; not overriding procedure Set_Short (Self : in out Option; Short : in Universal_Character) is begin Self.Short_Option := Short; end Set_Short; not overriding procedure Set_Help (Self : in out Option; Help : in Universal_String) is begin Self.Help_String := Help; end Set_Help; not overriding procedure Set_Valued (Self : in out Option) is begin Self.Has_Value := True; end Set_Valued; not overriding procedure Set_Required (Self : in out Option) is begin Self.Required := True; end Set_Required; end Matreshka.Opts.options;
reznikmm/matreshka
Ada
4,768
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$ ------------------------------------------------------------------------------ package Matreshka.ODF_Elements.Table.Covered_Table_Cell is type Table_Covered_Table_Cell_Node is new Matreshka.ODF_Elements.Table.Table_Node_Base with null record; type Table_Covered_Table_Cell_Access is access all Table_Covered_Table_Cell_Node'Class; overriding procedure Enter_Element (Self : not null access Table_Covered_Table_Cell_Node; Visitor : in out XML.DOM.Visitors.Abstract_Visitor'Class; Control : in out XML.DOM.Visitors.Traverse_Control); -- Dispatch call to corresponding subprogram of visitor interface. overriding function Get_Local_Name (Self : not null access constant Table_Covered_Table_Cell_Node) return League.Strings.Universal_String; overriding procedure Leave_Element (Self : not null access Table_Covered_Table_Cell_Node; Visitor : in out XML.DOM.Visitors.Abstract_Visitor'Class; Control : in out XML.DOM.Visitors.Traverse_Control); -- Dispatch call to corresponding subprogram of visitor interface. overriding procedure Visit_Element (Self : not null access Table_Covered_Table_Cell_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); -- Dispatch call to corresponding subprogram of iterator interface. end Matreshka.ODF_Elements.Table.Covered_Table_Cell;
reznikmm/matreshka
Ada
7,040
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.Index_Entry_Chapter_Elements is ------------ -- Create -- ------------ overriding function Create (Parameters : not null access Matreshka.DOM_Elements.Element_L2_Parameters) return Text_Index_Entry_Chapter_Element_Node is begin return Self : Text_Index_Entry_Chapter_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_Index_Entry_Chapter_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_Index_Entry_Chapter (ODF.DOM.Text_Index_Entry_Chapter_Elements.ODF_Text_Index_Entry_Chapter_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_Index_Entry_Chapter_Element_Node) return League.Strings.Universal_String is pragma Unreferenced (Self); begin return Matreshka.ODF_String_Constants.Index_Entry_Chapter_Element; end Get_Local_Name; ---------------- -- Leave_Node -- ---------------- overriding procedure Leave_Node (Self : not null access Text_Index_Entry_Chapter_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_Index_Entry_Chapter (ODF.DOM.Text_Index_Entry_Chapter_Elements.ODF_Text_Index_Entry_Chapter_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_Index_Entry_Chapter_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_Index_Entry_Chapter (Visitor, ODF.DOM.Text_Index_Entry_Chapter_Elements.ODF_Text_Index_Entry_Chapter_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.Index_Entry_Chapter_Element, Text_Index_Entry_Chapter_Element_Node'Tag); end Matreshka.ODF_Text.Index_Entry_Chapter_Elements;
optikos/oasis
Ada
2,620
adb
-- Copyright (c) 2019 Maxim Reznik <[email protected]> -- -- SPDX-License-Identifier: MIT -- License-Filename: LICENSE ------------------------------------------------------------- package body Program.Units.Declarations is ------------------ -- Append_Child -- ------------------ procedure Append_Child (Self : in out Unit_Declaration; Value : Program.Compilation_Units.Compilation_Unit_Access) is begin Self.Childern.Append (Value); end Append_Child; ------------------------ -- Corresponding_Body -- ------------------------ overriding function Corresponding_Body (Self : access Unit_Declaration) return Program.Library_Unit_Bodies.Library_Unit_Body_Access is begin return Self.Impl; end Corresponding_Body; ---------------------------- -- Corresponding_Childern -- ---------------------------- overriding function Corresponding_Childern (Self : access Unit_Declaration) return Program.Compilation_Unit_Vectors.Compilation_Unit_Vector_Access is begin if Self.Childern.Is_Empty then return null; else return Self.Childern'Access; end if; end Corresponding_Childern; ---------------- -- Initialize -- ---------------- procedure Initialize (Self : in out Unit_Declaration; Compilation : Program.Compilations.Compilation_Access; Full_Name : Text; Context_Clause : Program.Element_Vectors.Element_Vector_Access; Declaration : not null Program.Elements.Element_Access; Parent : Program.Library_Unit_Declarations .Library_Unit_Declaration_Access) is begin Self.Initialize (Compilation => Compilation, Full_Name => Full_Name, Context_Clause => Context_Clause, Unit_Declaration => Declaration); Self.Parent := Parent; if Parent not in null then Unit_Declaration (Parent.all).Append_Child (Self'Unchecked_Access); end if; Self.Childern.Clear; end Initialize; -------------- -- Set_Body -- -------------- procedure Set_Body (Self : in out Unit_Declaration; Value : Program.Library_Unit_Bodies.Library_Unit_Body_Access) is begin Self.Impl := Value; end Set_Body; ------------ -- Parent -- ------------ overriding function Parent (Self : access Unit_Declaration) return Program.Library_Unit_Declarations.Library_Unit_Declaration_Access is begin return Self.Parent; end Parent; end Program.Units.Declarations;
tum-ei-rcs/StratoX
Ada
383
ads
with Generic_Unit; package Mission with SPARK_Mode is package New_Unit is new Generic_Unit(Index_Type => Integer, Element_Type => Float); use New_Unit; -- the mission can only go forward type Mission_State_Type is ( UNKNOWN, INITIALIZING, SELF_TESTING, ASCENDING); procedure run_Mission; end Mission;
twdroeger/ada-awa
Ada
13,346
adb
----------------------------------------------------------------------- -- awa-applications -- Ada Web Application -- Copyright (C) 2009, 2010, 2011, 2012, 2013, 2014, 2015, 2016, 2017, 2018 Stephane Carrez -- Written by Stephane Carrez ([email protected]) -- -- Licensed under the Apache License, Version 2.0 (the "License"); -- you may not use this file except in compliance with the License. -- You may obtain a copy of the License at -- -- http://www.apache.org/licenses/LICENSE-2.0 -- -- Unless required by applicable law or agreed to in writing, software -- distributed under the License is distributed on an "AS IS" BASIS, -- WITHOUT WARRANTIES OR CONDITIONS OF ANY KIND, either express or implied. -- See the License for the specific language governing permissions and -- limitations under the License. ----------------------------------------------------------------------- with Ada.IO_Exceptions; with ADO.Sessions.Sources; with ADO.Configs; with EL.Contexts.Default; with Util.Files; with Util.Log.Loggers; with Security.Policies; with ASF.Server; with ASF.Servlets; with AWA.Services.Contexts; with AWA.Components.Factory; with AWA.Applications.Factory; with AWA.Applications.Configs; with AWA.Helpers.Selectors; with AWA.Permissions.Services; with AWA.Permissions.Beans; package body AWA.Applications is Log : constant Util.Log.Loggers.Logger := Util.Log.Loggers.Create ("AWA.Applications"); -- ------------------------------ -- Initialize the application -- ------------------------------ overriding procedure Initialize (App : in out Application; Conf : in ASF.Applications.Config; Factory : in out ASF.Applications.Main.Application_Factory'Class) is Ctx : AWA.Services.Contexts.Service_Context; begin Log.Info ("Initializing application"); Ctx.Set_Context (App'Unchecked_Access, null); AWA.Applications.Factory.Set_Application (Factory, App'Unchecked_Access); ASF.Applications.Main.Application (App).Initialize (Conf, Factory); -- Load the application configuration before any module. Application'Class (App).Load_Configuration (App.Get_Config (P_Config_File.P)); -- Register the application modules and load their configuration. Application'Class (App).Initialize_Modules; -- Load the plugin application configuration after the module are configured. Application'Class (App).Load_Configuration (App.Get_Config (P_Plugin_Config_File.P)); end Initialize; -- ------------------------------ -- Initialize the application configuration properties. Properties defined in <b>Conf</b> -- are expanded by using the EL expression resolver. -- ------------------------------ overriding procedure Initialize_Config (App : in out Application; Conf : in out ASF.Applications.Config) is Connection : ADO.Sessions.Sources.Data_Source; begin Log.Info ("Initializing configuration"); if Conf.Get ("app.modules.dir", "") = "" then Conf.Set ("app.modules.dir", "#{fn:composePath(app_search_dirs,'config')}"); end if; if Conf.Get ("bundle.dir", "") = "" then Conf.Set ("bundle.dir", "#{fn:composePath(app_search_dirs,'bundles')}"); end if; if Conf.Get ("ado.queries.paths", "") = "" then Conf.Set ("ado.queries.paths", "#{fn:composePath(app_search_dirs,'db')}"); end if; ADO.Configs.Initialize (Conf); ASF.Applications.Main.Application (App).Initialize_Config (Conf); Connection.Set_Connection (Conf.Get (P_Database.P)); Connection.Set_Property ("ado.queries.paths", Conf.Get ("ado.queries.paths", "")); Connection.Set_Property ("ado.queries.load", Conf.Get ("ado.queries.load", "")); App.DB_Factory.Create (Connection); App.DB_Factory.Set_Audit_Manager (App.Audits'Unchecked_Access); App.Audits.Initialize (App'Unchecked_Access); App.Events.Initialize (App'Unchecked_Access); AWA.Modules.Initialize (App.Modules, Conf); -- Use a specific error message when the NO_PERMISSION exception is raised. App.Get_Exception_Handler.Set_Message ("AWA.PERMISSIONS.NO_PERMISSION", "layout.exception_no_permission"); App.Register_Class ("AWA.Helpers.Selectors.Select_List_Bean", AWA.Helpers.Selectors.Create_Select_List_Bean'Access); App.Register_Class ("AWA.Permissions.Beans.Permission_Bean", AWA.Permissions.Beans.Create_Permission_Bean'Access); end Initialize_Config; -- ------------------------------ -- Initialize the servlets provided by the application. -- This procedure is called by <b>Initialize</b>. -- It should register the application servlets. -- ------------------------------ overriding procedure Initialize_Servlets (App : in out Application) is begin Log.Info ("Initializing application servlets"); ASF.Applications.Main.Application (App).Initialize_Servlets; end Initialize_Servlets; -- ------------------------------ -- Initialize the filters provided by the application. -- This procedure is called by <b>Initialize</b>. -- It should register the application filters. -- ------------------------------ overriding procedure Initialize_Filters (App : in out Application) is begin Log.Info ("Initializing application filters"); ASF.Applications.Main.Application (App).Initialize_Filters; end Initialize_Filters; -- ------------------------------ -- Initialize the ASF components provided by the application. -- This procedure is called by <b>Initialize</b>. -- It should register the component factories used by the application. -- ------------------------------ overriding procedure Initialize_Components (App : in out Application) is procedure Register_Functions is new ASF.Applications.Main.Register_Functions (AWA.Permissions.Services.Set_Functions); begin Log.Info ("Initializing application components"); ASF.Applications.Main.Application (App).Initialize_Components; App.Add_Components (AWA.Components.Factory.Definition); Register_Functions (App); end Initialize_Components; -- ------------------------------ -- Read the application configuration file <b>awa.xml</b>. This is called after the servlets -- and filters have been registered in the application but before the module registration. -- ------------------------------ procedure Load_Configuration (App : in out Application; Files : in String) is procedure Load_Config (File : in String; Done : out Boolean); Paths : constant String := App.Get_Config (P_Module_Dir.P); Ctx : aliased EL.Contexts.Default.Default_Context; procedure Load_Config (File : in String; Done : out Boolean) is Path : constant String := Util.Files.Find_File_Path (File, Paths); begin Done := False; AWA.Applications.Configs.Read_Configuration (App, Path, Ctx'Unchecked_Access, True); exception when Ada.IO_Exceptions.Name_Error => Log.Warn ("Application configuration file '{0}' does not exist", Path); end Load_Config; begin Util.Files.Iterate_Path (Files, Load_Config'Access); end Load_Configuration; -- ------------------------------ -- Initialize the AWA modules provided by the application. -- This procedure is called by <b>Initialize</b>. -- It should register the modules used by the application. -- ------------------------------ procedure Initialize_Modules (App : in out Application) is begin null; end Initialize_Modules; -- ------------------------------ -- Start the application. This is called by the server container when the server is started. -- ------------------------------ overriding procedure Start (App : in out Application) is Manager : constant Security.Policies.Policy_Manager_Access := App.Get_Security_Manager; begin -- Start the security manager. AWA.Permissions.Services.Permission_Manager'Class (Manager.all).Start; -- Start the event service. App.Events.Start; -- Start the application. ASF.Applications.Main.Application (App).Start; -- Dump the route and filters to help in configuration issues. App.Dump_Routes (Util.Log.INFO_LEVEL); end Start; -- ------------------------------ -- Close the application. -- ------------------------------ overriding procedure Close (App : in out Application) is begin App.Events.Stop; ASF.Applications.Main.Application (App).Close; end Close; -- ------------------------------ -- Register the module in the application -- ------------------------------ procedure Register (App : in Application_Access; Module : access AWA.Modules.Module'Class; Name : in String; URI : in String := "") is begin App.Register (Module.all'Unchecked_Access, Name, URI); end Register; -- ------------------------------ -- Get the database connection for reading -- ------------------------------ function Get_Session (App : Application) return ADO.Sessions.Session is begin return App.DB_Factory.Get_Session; end Get_Session; -- ------------------------------ -- Get the database connection for writing -- ------------------------------ function Get_Master_Session (App : Application) return ADO.Sessions.Master_Session is begin return App.DB_Factory.Get_Master_Session; end Get_Master_Session; -- ------------------------------ -- Find the module with the given name -- ------------------------------ function Find_Module (App : in Application; Name : in String) return AWA.Modules.Module_Access is begin return AWA.Modules.Find_By_Name (App.Modules, Name); end Find_Module; -- ------------------------------ -- Register the module in the application -- ------------------------------ procedure Register (App : in out Application; Module : in AWA.Modules.Module_Access; Name : in String; URI : in String := "") is begin AWA.Modules.Register (App.Modules'Unchecked_Access, App'Unchecked_Access, Module, Name, URI); end Register; -- ------------------------------ -- Send the event in the application event queues. -- ------------------------------ procedure Send_Event (App : in Application; Event : in AWA.Events.Module_Event'Class) is begin App.Events.Send (Event); end Send_Event; -- ------------------------------ -- Execute the <tt>Process</tt> procedure with the event manager used by the application. -- ------------------------------ procedure Do_Event_Manager (App : in out Application; Process : access procedure (Events : in out AWA.Events.Services.Event_Manager)) is begin Process (App.Events); end Do_Event_Manager; -- ------------------------------ -- Initialize the parser represented by <b>Parser</b> to recognize the configuration -- that are specific to the plugins that have been registered so far. -- ------------------------------ procedure Initialize_Parser (App : in out Application'Class; Parser : in out Util.Serialize.IO.Parser'Class) is procedure Process (Module : in out AWA.Modules.Module'Class); procedure Process (Module : in out AWA.Modules.Module'Class) is begin Module.Initialize_Parser (Parser); end Process; begin AWA.Modules.Iterate (App.Modules, Process'Access); end Initialize_Parser; -- ------------------------------ -- Get the current application from the servlet context or service context. -- ------------------------------ function Current return Application_Access is use type AWA.Services.Contexts.Service_Context_Access; Ctx : constant AWA.Services.Contexts.Service_Context_Access := AWA.Services.Contexts.Current; begin if Ctx /= null then return Ctx.Get_Application; end if; -- If there is no service context, look in the servlet current context. declare use type ASF.Servlets.Servlet_Registry_Access; Ctx : constant ASF.Servlets.Servlet_Registry_Access := ASF.Server.Current; begin if Ctx = null then Log.Warn ("There is no service context"); return null; end if; if not (Ctx.all in AWA.Applications.Application'Class) then Log.Warn ("The servlet context is not an application"); return null; end if; return AWA.Applications.Application'Class (Ctx.all)'Access; end; end Current; end AWA.Applications;
msrLi/portingSources
Ada
804
ads
-- Copyright 2013-2014 Free Software Foundation, Inc. -- -- This program is free software; you can redistribute it and/or modify -- it under the terms of the GNU General Public License as published by -- the Free Software Foundation; either version 3 of the License, or -- (at your option) any later version. -- -- This program is distributed in the hope that it will be useful, -- but WITHOUT ANY WARRANTY; without even the implied warranty of -- MERCHANTABILITY or FITNESS FOR A PARTICULAR PURPOSE. See the -- GNU General Public License for more details. -- -- You should have received a copy of the GNU General Public License -- along with this program. If not, see <http://www.gnu.org/licenses/>. package Callee is procedure Increment (Val : in out Float; Msg : String); end Callee;
Heziode/lsystem-editor
Ada
3,172
ads
------------------------------------------------------------------------------- -- 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. ------------------------------------------------------------------------------- limited with LSE.Model.IO.Turtle; with LSE.Utils.Coordinate_2D; with LSE.Utils.Utils; use LSE.Utils.Coordinate_2D; use LSE.Utils.Utils; -- @description -- Service of drawing area. It encapsulates a set of -- structures and methods which is designed to draw what is dictated to him -- on a specific medium. -- package LSE.Model.IO.Drawing_Area is -- Service of drawing area type Services is interface; -- Special configuration depending to medium -- @param Turtle Reference to the turtle procedure Configure (This : in out Services; Turtle : LSE.Model.IO.Turtle.Instance) is abstract; -- Draw the final representation (save file, display in screen, etc.) procedure Draw (This : in out Services) is abstract; -- Go forward -- @param Coordinate Destination where to go -- @param Trace True for stroke, False otherwise procedure Forward (This : in out Services; Coordinate : LSE.Utils.Coordinate_2D.Coordinate; Trace : Boolean := False) is abstract; -- Positive rotation by angle procedure Rotate_Clockwise (This : in out Services) is abstract; -- Negative rotation by angle procedure Rotate_Anticlockwise (This : in out Services) is abstract; -- Go backward procedure UTurn (This : in out Services) is abstract; -- Save the current position in medium procedure Position_Save (This : in out Services) is abstract; -- Restore the previous saved location in medium -- @param X Position on the abscissa -- @param Y Position on the ordinate procedure Position_Restore (This : in out Services; X, Y : Fixed_Point) is abstract; end LSE.Model.IO.Drawing_Area;
Sawchord/Ada_Drivers_Library
Ada
2,354
adb
with Ada.Text_IO; use Ada.Text_IO; with Ada.Integer_Text_IO; use Ada.Integer_Text_IO; with Posix; with HAL; with HAL.SPI; use HAL.SPI; with HAL.I2C; use HAL.I2C; with Native.SPI; -- use Native.SPI; with Native.I2C; procedure Spi_Test is SPI_Device : String := "/dev/spidev0.0"; SPI_Conf : Native.SPI.SPI_Configuration := (Data_Size => HAL.SPI.Data_Size_16b, Clock_Polarity => Native.SPI.High, Clock_Phase => Native.SPI.P1Edge, Slave_Manager => Native.SPI.Hardware_Managed, First_Bit => Native.SPI.MSB, Baud_Rate => 100_000); SPI_Port : Native.SPI.SPI_Port; SPI_Status : HAL.SPI.SPI_Status; SPI_Out_Data : HAL.SPI.SPI_Data_16b(1..1) := (1 => 16#D0#); SPI_In_Data : HAL.SPI.SPI_Data_16b(1..1); I2C_Device : String := "/dev/i2c-1"; I2C_Conf : Native.I2C.I2C_Configuration := (Addressing_Mode => Native.I2C.Addressing_Mode_7bit, Ack => Native.I2C.Ack_Enable, Device_Mode => Native.I2C.I2C_Mode); I2C_Port : Native.I2C.I2C_Port; I2C_Status : HAL.I2C.I2C_Status; I2C_Addr : HAL.I2C.I2C_Address := 16#0A#; I2C_Data : HAL.I2C.I2C_Data := (5,6,7,8); begin Put_Line ("Hello SPI"); -- Initialize the SPI_Port with given Configuration SPI_Port := Native.SPI.Configure (SPI_Device, SPI_Conf, SPI_Status); if SPI_Status /= HAL.SPI.Ok then Put_Line ("Error while initializing SPI Device"); return; end if; -- Send Data over the Wire Put_Line ("SPI Initialized, attempt to send"); SPI_Port.Transmit(SPI_Out_Data, SPI_Status); if SPI_Status /= HAL.SPI.Ok then Put_Line ("Error while transmitting SPI data"); return; end if; Put_Line ("Transmission was successfull"); SPI_Port.Receive(SPI_In_Data, SPI_Status); if SPI_Status /= HAL.SPI.Ok then Put_Line ("Error while receiving SPI data"); return; end if; Put ("Reveiced value:"); Put (Integer(SPI_In_Data(1)), 2); New_Line; Put_Line ("Hello I2C"); I2C_Port := Native.I2C.Configure (I2C_Device, I2C_Conf, I2C_Status); if I2C_Status /= HAL.I2C.Ok then Put_Line ("Error while initializing I2C Device"); end if; I2C_Port.Master_Transmit (I2C_Addr, I2C_Data, I2C_Status); if I2C_Status /= HAL.I2C.Ok then Put_Line ("Error while transmitting I2C data"); end if; end;
Fabien-Chouteau/samd51-hal
Ada
40,864
ads
-- Generated by a script from an "avr tools device file" (atdf) with SAM.Port; use SAM.Port; package SAM.Functions is PA04_AC_AIN0 : constant Peripheral_Function := B; PA05_AC_AIN1 : constant Peripheral_Function := B; PA06_AC_AIN2 : constant Peripheral_Function := B; PA07_AC_AIN3 : constant Peripheral_Function := B; PA12_AC_CMP0 : constant Peripheral_Function := M; PA18_AC_CMP0 : constant Peripheral_Function := M; PB24_AC_CMP0 : constant Peripheral_Function := M; PA13_AC_CMP1 : constant Peripheral_Function := M; PA19_AC_CMP1 : constant Peripheral_Function := M; PB25_AC_CMP1 : constant Peripheral_Function := M; PA02_ADC0_AIN0 : constant Peripheral_Function := B; PA03_ADC0_AIN1 : constant Peripheral_Function := B; PB08_ADC0_AIN2 : constant Peripheral_Function := B; PB09_ADC0_AIN3 : constant Peripheral_Function := B; PA04_ADC0_AIN4 : constant Peripheral_Function := B; PA05_ADC0_AIN5 : constant Peripheral_Function := B; PA06_ADC0_AIN6 : constant Peripheral_Function := B; PA07_ADC0_AIN7 : constant Peripheral_Function := B; PA08_ADC0_AIN8 : constant Peripheral_Function := B; PA09_ADC0_AIN9 : constant Peripheral_Function := B; PA10_ADC0_AIN10 : constant Peripheral_Function := B; PA11_ADC0_AIN11 : constant Peripheral_Function := B; PB00_ADC0_AIN12 : constant Peripheral_Function := B; PB01_ADC0_AIN13 : constant Peripheral_Function := B; PB02_ADC0_AIN14 : constant Peripheral_Function := B; PB03_ADC0_AIN15 : constant Peripheral_Function := B; PA03_ADC0_X0 : constant Peripheral_Function := B; PA03_ADC0_Y0 : constant Peripheral_Function := B; PB08_ADC0_X1 : constant Peripheral_Function := B; PB08_ADC0_Y1 : constant Peripheral_Function := B; PB09_ADC0_X2 : constant Peripheral_Function := B; PB09_ADC0_Y2 : constant Peripheral_Function := B; PA04_ADC0_X3 : constant Peripheral_Function := B; PA04_ADC0_Y3 : constant Peripheral_Function := B; PA06_ADC0_X4 : constant Peripheral_Function := B; PA06_ADC0_Y4 : constant Peripheral_Function := B; PA07_ADC0_X5 : constant Peripheral_Function := B; PA07_ADC0_Y5 : constant Peripheral_Function := B; PA08_ADC0_X6 : constant Peripheral_Function := B; PA08_ADC0_Y6 : constant Peripheral_Function := B; PA09_ADC0_X7 : constant Peripheral_Function := B; PA09_ADC0_Y7 : constant Peripheral_Function := B; PA10_ADC0_X8 : constant Peripheral_Function := B; PA10_ADC0_Y8 : constant Peripheral_Function := B; PA11_ADC0_X9 : constant Peripheral_Function := B; PA11_ADC0_Y9 : constant Peripheral_Function := B; PA16_ADC0_X10 : constant Peripheral_Function := B; PA16_ADC0_Y10 : constant Peripheral_Function := B; PA17_ADC0_X11 : constant Peripheral_Function := B; PA17_ADC0_Y11 : constant Peripheral_Function := B; PA18_ADC0_X12 : constant Peripheral_Function := B; PA18_ADC0_Y12 : constant Peripheral_Function := B; PA19_ADC0_X13 : constant Peripheral_Function := B; PA19_ADC0_Y13 : constant Peripheral_Function := B; PA20_ADC0_X14 : constant Peripheral_Function := B; PA20_ADC0_Y14 : constant Peripheral_Function := B; PA21_ADC0_X15 : constant Peripheral_Function := B; PA21_ADC0_Y15 : constant Peripheral_Function := B; PA22_ADC0_X16 : constant Peripheral_Function := B; PA22_ADC0_Y16 : constant Peripheral_Function := B; PA23_ADC0_X17 : constant Peripheral_Function := B; PA23_ADC0_Y17 : constant Peripheral_Function := B; PA27_ADC0_X18 : constant Peripheral_Function := B; PA27_ADC0_Y18 : constant Peripheral_Function := B; PA30_ADC0_X19 : constant Peripheral_Function := B; PA30_ADC0_Y19 : constant Peripheral_Function := B; PB02_ADC0_X20 : constant Peripheral_Function := B; PB02_ADC0_Y20 : constant Peripheral_Function := B; PB03_ADC0_X21 : constant Peripheral_Function := B; PB03_ADC0_Y21 : constant Peripheral_Function := B; PB04_ADC0_X22 : constant Peripheral_Function := B; PB04_ADC0_Y22 : constant Peripheral_Function := B; PB05_ADC0_X23 : constant Peripheral_Function := B; PB05_ADC0_Y23 : constant Peripheral_Function := B; PB06_ADC0_X24 : constant Peripheral_Function := B; PB06_ADC0_Y24 : constant Peripheral_Function := B; PB07_ADC0_X25 : constant Peripheral_Function := B; PB07_ADC0_Y25 : constant Peripheral_Function := B; PB12_ADC0_X26 : constant Peripheral_Function := B; PB12_ADC0_Y26 : constant Peripheral_Function := B; PB13_ADC0_X27 : constant Peripheral_Function := B; PB13_ADC0_Y27 : constant Peripheral_Function := B; PB14_ADC0_X28 : constant Peripheral_Function := B; PB14_ADC0_Y28 : constant Peripheral_Function := B; PB15_ADC0_X29 : constant Peripheral_Function := B; PB15_ADC0_Y29 : constant Peripheral_Function := B; PB00_ADC0_X30 : constant Peripheral_Function := B; PB00_ADC0_Y30 : constant Peripheral_Function := B; PB01_ADC0_X31 : constant Peripheral_Function := B; PB01_ADC0_Y31 : constant Peripheral_Function := B; PB08_ADC1_AIN0 : constant Peripheral_Function := B; PB09_ADC1_AIN1 : constant Peripheral_Function := B; PA08_ADC1_AIN2 : constant Peripheral_Function := B; PA09_ADC1_AIN3 : constant Peripheral_Function := B; PC02_ADC1_AIN4 : constant Peripheral_Function := B; PC03_ADC1_AIN5 : constant Peripheral_Function := B; PB04_ADC1_AIN6 : constant Peripheral_Function := B; PB05_ADC1_AIN7 : constant Peripheral_Function := B; PB06_ADC1_AIN8 : constant Peripheral_Function := B; PB07_ADC1_AIN9 : constant Peripheral_Function := B; PC00_ADC1_AIN10 : constant Peripheral_Function := B; PC01_ADC1_AIN11 : constant Peripheral_Function := B; PC30_ADC1_AIN12 : constant Peripheral_Function := B; PC31_ADC1_AIN13 : constant Peripheral_Function := B; PD00_ADC1_AIN14 : constant Peripheral_Function := B; PD01_ADC1_AIN15 : constant Peripheral_Function := B; PA04_CCL_IN0 : constant Peripheral_Function := N; PA16_CCL_IN0 : constant Peripheral_Function := N; PB22_CCL_IN0 : constant Peripheral_Function := N; PA05_CCL_IN1 : constant Peripheral_Function := N; PA17_CCL_IN1 : constant Peripheral_Function := N; PB00_CCL_IN1 : constant Peripheral_Function := N; PA06_CCL_IN2 : constant Peripheral_Function := N; PA18_CCL_IN2 : constant Peripheral_Function := N; PB01_CCL_IN2 : constant Peripheral_Function := N; PA08_CCL_IN3 : constant Peripheral_Function := N; PA30_CCL_IN3 : constant Peripheral_Function := N; PA09_CCL_IN4 : constant Peripheral_Function := N; PC27_CCL_IN4 : constant Peripheral_Function := N; PA10_CCL_IN5 : constant Peripheral_Function := N; PC28_CCL_IN5 : constant Peripheral_Function := N; PA22_CCL_IN6 : constant Peripheral_Function := N; PB06_CCL_IN6 : constant Peripheral_Function := N; PA23_CCL_IN7 : constant Peripheral_Function := N; PB07_CCL_IN7 : constant Peripheral_Function := N; PA24_CCL_IN8 : constant Peripheral_Function := N; PB08_CCL_IN8 : constant Peripheral_Function := N; PB14_CCL_IN9 : constant Peripheral_Function := N; PC20_CCL_IN9 : constant Peripheral_Function := N; PB15_CCL_IN10 : constant Peripheral_Function := N; PC21_CCL_IN10 : constant Peripheral_Function := N; PB10_CCL_IN11 : constant Peripheral_Function := N; PB16_CCL_IN11 : constant Peripheral_Function := N; PA07_CCL_OUT0 : constant Peripheral_Function := N; PA19_CCL_OUT0 : constant Peripheral_Function := N; PB02_CCL_OUT0 : constant Peripheral_Function := N; PB23_CCL_OUT0 : constant Peripheral_Function := N; PA11_CCL_OUT1 : constant Peripheral_Function := N; PA31_CCL_OUT1 : constant Peripheral_Function := N; PB11_CCL_OUT1 : constant Peripheral_Function := N; PA25_CCL_OUT2 : constant Peripheral_Function := N; PB09_CCL_OUT2 : constant Peripheral_Function := N; PB17_CCL_OUT3 : constant Peripheral_Function := N; PA02_DAC_VOUT0 : constant Peripheral_Function := B; PA05_DAC_VOUT1 : constant Peripheral_Function := B; PA00_EIC_EXTINT0 : constant Peripheral_Function := A; PA16_EIC_EXTINT0 : constant Peripheral_Function := A; PB00_EIC_EXTINT0 : constant Peripheral_Function := A; PB16_EIC_EXTINT0 : constant Peripheral_Function := A; PC00_EIC_EXTINT0 : constant Peripheral_Function := A; PC16_EIC_EXTINT0 : constant Peripheral_Function := A; PD00_EIC_EXTINT0 : constant Peripheral_Function := A; PA01_EIC_EXTINT1 : constant Peripheral_Function := A; PA17_EIC_EXTINT1 : constant Peripheral_Function := A; PB01_EIC_EXTINT1 : constant Peripheral_Function := A; PB17_EIC_EXTINT1 : constant Peripheral_Function := A; PC01_EIC_EXTINT1 : constant Peripheral_Function := A; PC17_EIC_EXTINT1 : constant Peripheral_Function := A; PD01_EIC_EXTINT1 : constant Peripheral_Function := A; PA02_EIC_EXTINT2 : constant Peripheral_Function := A; PA18_EIC_EXTINT2 : constant Peripheral_Function := A; PB02_EIC_EXTINT2 : constant Peripheral_Function := A; PB18_EIC_EXTINT2 : constant Peripheral_Function := A; PC02_EIC_EXTINT2 : constant Peripheral_Function := A; PC18_EIC_EXTINT2 : constant Peripheral_Function := A; PA03_EIC_EXTINT3 : constant Peripheral_Function := A; PA19_EIC_EXTINT3 : constant Peripheral_Function := A; PB03_EIC_EXTINT3 : constant Peripheral_Function := A; PB19_EIC_EXTINT3 : constant Peripheral_Function := A; PC03_EIC_EXTINT3 : constant Peripheral_Function := A; PC19_EIC_EXTINT3 : constant Peripheral_Function := A; PD08_EIC_EXTINT3 : constant Peripheral_Function := A; PA04_EIC_EXTINT4 : constant Peripheral_Function := A; PA20_EIC_EXTINT4 : constant Peripheral_Function := A; PB04_EIC_EXTINT4 : constant Peripheral_Function := A; PB20_EIC_EXTINT4 : constant Peripheral_Function := A; PC04_EIC_EXTINT4 : constant Peripheral_Function := A; PC20_EIC_EXTINT4 : constant Peripheral_Function := A; PD09_EIC_EXTINT4 : constant Peripheral_Function := A; PA05_EIC_EXTINT5 : constant Peripheral_Function := A; PA21_EIC_EXTINT5 : constant Peripheral_Function := A; PB05_EIC_EXTINT5 : constant Peripheral_Function := A; PB21_EIC_EXTINT5 : constant Peripheral_Function := A; PC05_EIC_EXTINT5 : constant Peripheral_Function := A; PC21_EIC_EXTINT5 : constant Peripheral_Function := A; PD10_EIC_EXTINT5 : constant Peripheral_Function := A; PA06_EIC_EXTINT6 : constant Peripheral_Function := A; PA22_EIC_EXTINT6 : constant Peripheral_Function := A; PB06_EIC_EXTINT6 : constant Peripheral_Function := A; PB22_EIC_EXTINT6 : constant Peripheral_Function := A; PC06_EIC_EXTINT6 : constant Peripheral_Function := A; PC22_EIC_EXTINT6 : constant Peripheral_Function := A; PD11_EIC_EXTINT6 : constant Peripheral_Function := A; PA07_EIC_EXTINT7 : constant Peripheral_Function := A; PA23_EIC_EXTINT7 : constant Peripheral_Function := A; PB07_EIC_EXTINT7 : constant Peripheral_Function := A; PB23_EIC_EXTINT7 : constant Peripheral_Function := A; PC23_EIC_EXTINT7 : constant Peripheral_Function := A; PD12_EIC_EXTINT7 : constant Peripheral_Function := A; PA24_EIC_EXTINT8 : constant Peripheral_Function := A; PB08_EIC_EXTINT8 : constant Peripheral_Function := A; PB24_EIC_EXTINT8 : constant Peripheral_Function := A; PC24_EIC_EXTINT8 : constant Peripheral_Function := A; PA09_EIC_EXTINT9 : constant Peripheral_Function := A; PA25_EIC_EXTINT9 : constant Peripheral_Function := A; PB09_EIC_EXTINT9 : constant Peripheral_Function := A; PB25_EIC_EXTINT9 : constant Peripheral_Function := A; PC07_EIC_EXTINT9 : constant Peripheral_Function := A; PC25_EIC_EXTINT9 : constant Peripheral_Function := A; PA10_EIC_EXTINT10 : constant Peripheral_Function := A; PB10_EIC_EXTINT10 : constant Peripheral_Function := A; PC10_EIC_EXTINT10 : constant Peripheral_Function := A; PC26_EIC_EXTINT10 : constant Peripheral_Function := A; PD20_EIC_EXTINT10 : constant Peripheral_Function := A; PA11_EIC_EXTINT11 : constant Peripheral_Function := A; PA27_EIC_EXTINT11 : constant Peripheral_Function := A; PB11_EIC_EXTINT11 : constant Peripheral_Function := A; PC11_EIC_EXTINT11 : constant Peripheral_Function := A; PC27_EIC_EXTINT11 : constant Peripheral_Function := A; PD21_EIC_EXTINT11 : constant Peripheral_Function := A; PA12_EIC_EXTINT12 : constant Peripheral_Function := A; PB12_EIC_EXTINT12 : constant Peripheral_Function := A; PB26_EIC_EXTINT12 : constant Peripheral_Function := A; PC12_EIC_EXTINT12 : constant Peripheral_Function := A; PC28_EIC_EXTINT12 : constant Peripheral_Function := A; PA13_EIC_EXTINT13 : constant Peripheral_Function := A; PB13_EIC_EXTINT13 : constant Peripheral_Function := A; PB27_EIC_EXTINT13 : constant Peripheral_Function := A; PC13_EIC_EXTINT13 : constant Peripheral_Function := A; PA30_EIC_EXTINT14 : constant Peripheral_Function := A; PB14_EIC_EXTINT14 : constant Peripheral_Function := A; PB28_EIC_EXTINT14 : constant Peripheral_Function := A; PB30_EIC_EXTINT14 : constant Peripheral_Function := A; PC14_EIC_EXTINT14 : constant Peripheral_Function := A; PC30_EIC_EXTINT14 : constant Peripheral_Function := A; PA14_EIC_EXTINT14 : constant Peripheral_Function := A; PA15_EIC_EXTINT15 : constant Peripheral_Function := A; PA31_EIC_EXTINT15 : constant Peripheral_Function := A; PB15_EIC_EXTINT15 : constant Peripheral_Function := A; PB29_EIC_EXTINT15 : constant Peripheral_Function := A; PB31_EIC_EXTINT15 : constant Peripheral_Function := A; PC15_EIC_EXTINT15 : constant Peripheral_Function := A; PC31_EIC_EXTINT15 : constant Peripheral_Function := A; PA08_EIC_NMI : constant Peripheral_Function := A; PA30_GCLK_IO0 : constant Peripheral_Function := M; PB14_GCLK_IO0 : constant Peripheral_Function := M; PA14_GCLK_IO0 : constant Peripheral_Function := M; PB22_GCLK_IO0 : constant Peripheral_Function := M; PB15_GCLK_IO1 : constant Peripheral_Function := M; PA15_GCLK_IO1 : constant Peripheral_Function := M; PB23_GCLK_IO1 : constant Peripheral_Function := M; PA27_GCLK_IO1 : constant Peripheral_Function := M; PA16_GCLK_IO2 : constant Peripheral_Function := M; PB16_GCLK_IO2 : constant Peripheral_Function := M; PA17_GCLK_IO3 : constant Peripheral_Function := M; PB17_GCLK_IO3 : constant Peripheral_Function := M; PA10_GCLK_IO4 : constant Peripheral_Function := M; PB10_GCLK_IO4 : constant Peripheral_Function := M; PB18_GCLK_IO4 : constant Peripheral_Function := M; PA11_GCLK_IO5 : constant Peripheral_Function := M; PB11_GCLK_IO5 : constant Peripheral_Function := M; PB19_GCLK_IO5 : constant Peripheral_Function := M; PB12_GCLK_IO6 : constant Peripheral_Function := M; PB20_GCLK_IO6 : constant Peripheral_Function := M; PB13_GCLK_IO7 : constant Peripheral_Function := M; PB21_GCLK_IO7 : constant Peripheral_Function := M; PA09_I2S_FS0 : constant Peripheral_Function := J; PA20_I2S_FS0 : constant Peripheral_Function := J; PA23_I2S_FS1 : constant Peripheral_Function := J; PB11_I2S_FS1 : constant Peripheral_Function := J; PA08_I2S_MCK0 : constant Peripheral_Function := J; PB17_I2S_MCK0 : constant Peripheral_Function := J; PB29_I2S_MCK1 : constant Peripheral_Function := J; PB13_I2S_MCK1 : constant Peripheral_Function := J; PA10_I2S_SCK0 : constant Peripheral_Function := J; PB16_I2S_SCK0 : constant Peripheral_Function := J; PB28_I2S_SCK1 : constant Peripheral_Function := J; PB12_I2S_SCK1 : constant Peripheral_Function := J; PA22_I2S_SDI : constant Peripheral_Function := J; PB10_I2S_SDI : constant Peripheral_Function := J; PA11_I2S_SDO : constant Peripheral_Function := J; PA21_I2S_SDO : constant Peripheral_Function := J; PA14_PCC_CLK : constant Peripheral_Function := K; PA16_PCC_DATA0 : constant Peripheral_Function := K; PA17_PCC_DATA1 : constant Peripheral_Function := K; PA18_PCC_DATA2 : constant Peripheral_Function := K; PA19_PCC_DATA3 : constant Peripheral_Function := K; PA20_PCC_DATA4 : constant Peripheral_Function := K; PA21_PCC_DATA5 : constant Peripheral_Function := K; PA22_PCC_DATA6 : constant Peripheral_Function := K; PA23_PCC_DATA7 : constant Peripheral_Function := K; PB14_PCC_DATA8 : constant Peripheral_Function := K; PB15_PCC_DATA9 : constant Peripheral_Function := K; PC12_PCC_DATA10 : constant Peripheral_Function := K; PC13_PCC_DATA11 : constant Peripheral_Function := K; PC14_PCC_DATA12 : constant Peripheral_Function := K; PC15_PCC_DATA13 : constant Peripheral_Function := K; PA12_PCC_DEN1 : constant Peripheral_Function := K; PA13_PCC_DEN2 : constant Peripheral_Function := K; PB18_PDEC_QDI0 : constant Peripheral_Function := G; PB23_PDEC_QDI0 : constant Peripheral_Function := G; PC16_PDEC_QDI0 : constant Peripheral_Function := G; PA24_PDEC_QDI0 : constant Peripheral_Function := G; PB19_PDEC_QDI1 : constant Peripheral_Function := G; PB24_PDEC_QDI1 : constant Peripheral_Function := G; PC17_PDEC_QDI1 : constant Peripheral_Function := G; PA25_PDEC_QDI1 : constant Peripheral_Function := G; PB20_PDEC_QDI2 : constant Peripheral_Function := G; PB25_PDEC_QDI2 : constant Peripheral_Function := G; PC18_PDEC_QDI2 : constant Peripheral_Function := G; PB22_PDEC_QDI2 : constant Peripheral_Function := G; PB11_QSPI_CS : constant Peripheral_Function := H; PA08_QSPI_DATA0 : constant Peripheral_Function := H; PA09_QSPI_DATA1 : constant Peripheral_Function := H; PA10_QSPI_DATA2 : constant Peripheral_Function := H; PA11_QSPI_DATA3 : constant Peripheral_Function := H; PB10_QSPI_SCK : constant Peripheral_Function := H; PA06_SDHC0_SDCD : constant Peripheral_Function := I; PA12_SDHC0_SDCD : constant Peripheral_Function := I; PB12_SDHC0_SDCD : constant Peripheral_Function := I; PC06_SDHC0_SDCD : constant Peripheral_Function := I; PB11_SDHC0_SDCK : constant Peripheral_Function := I; PA08_SDHC0_SDCMD : constant Peripheral_Function := I; PA09_SDHC0_SDDAT0 : constant Peripheral_Function := I; PA10_SDHC0_SDDAT1 : constant Peripheral_Function := I; PA11_SDHC0_SDDAT2 : constant Peripheral_Function := I; PB10_SDHC0_SDDAT3 : constant Peripheral_Function := I; PA07_SDHC0_SDWP : constant Peripheral_Function := I; PA13_SDHC0_SDWP : constant Peripheral_Function := I; PB13_SDHC0_SDWP : constant Peripheral_Function := I; PC07_SDHC0_SDWP : constant Peripheral_Function := I; PB16_SDHC1_SDCD : constant Peripheral_Function := I; PC20_SDHC1_SDCD : constant Peripheral_Function := I; PD20_SDHC1_SDCD : constant Peripheral_Function := I; PA21_SDHC1_SDCK : constant Peripheral_Function := I; PA20_SDHC1_SDCMD : constant Peripheral_Function := I; PB18_SDHC1_SDDAT0 : constant Peripheral_Function := I; PB19_SDHC1_SDDAT1 : constant Peripheral_Function := I; PB20_SDHC1_SDDAT2 : constant Peripheral_Function := I; PB21_SDHC1_SDDAT3 : constant Peripheral_Function := I; PB17_SDHC1_SDWP : constant Peripheral_Function := I; PC21_SDHC1_SDWP : constant Peripheral_Function := I; PD21_SDHC1_SDWP : constant Peripheral_Function := I; PA04_SERCOM0_PAD0 : constant Peripheral_Function := D; PC17_SERCOM0_PAD0 : constant Peripheral_Function := D; PA08_SERCOM0_PAD0 : constant Peripheral_Function := C; PB24_SERCOM0_PAD0 : constant Peripheral_Function := C; PA05_SERCOM0_PAD1 : constant Peripheral_Function := D; PC16_SERCOM0_PAD1 : constant Peripheral_Function := D; PA09_SERCOM0_PAD1 : constant Peripheral_Function := C; PB25_SERCOM0_PAD1 : constant Peripheral_Function := C; PA06_SERCOM0_PAD2 : constant Peripheral_Function := D; PC18_SERCOM0_PAD2 : constant Peripheral_Function := D; PA10_SERCOM0_PAD2 : constant Peripheral_Function := C; PC24_SERCOM0_PAD2 : constant Peripheral_Function := C; PA07_SERCOM0_PAD3 : constant Peripheral_Function := D; PC19_SERCOM0_PAD3 : constant Peripheral_Function := D; PA11_SERCOM0_PAD3 : constant Peripheral_Function := C; PC25_SERCOM0_PAD3 : constant Peripheral_Function := C; PA00_SERCOM1_PAD0 : constant Peripheral_Function := D; PA16_SERCOM1_PAD0 : constant Peripheral_Function := C; PC22_SERCOM1_PAD0 : constant Peripheral_Function := C; PC27_SERCOM1_PAD0 : constant Peripheral_Function := C; PA01_SERCOM1_PAD1 : constant Peripheral_Function := D; PA17_SERCOM1_PAD1 : constant Peripheral_Function := C; PC23_SERCOM1_PAD1 : constant Peripheral_Function := C; PC28_SERCOM1_PAD1 : constant Peripheral_Function := C; PA30_SERCOM1_PAD2 : constant Peripheral_Function := D; PA18_SERCOM1_PAD2 : constant Peripheral_Function := C; PB22_SERCOM1_PAD2 : constant Peripheral_Function := C; PD20_SERCOM1_PAD2 : constant Peripheral_Function := C; PA31_SERCOM1_PAD3 : constant Peripheral_Function := D; PA19_SERCOM1_PAD3 : constant Peripheral_Function := C; PB23_SERCOM1_PAD3 : constant Peripheral_Function := C; PD21_SERCOM1_PAD3 : constant Peripheral_Function := C; PA09_SERCOM2_PAD0 : constant Peripheral_Function := D; PB25_SERCOM2_PAD0 : constant Peripheral_Function := D; PA12_SERCOM2_PAD0 : constant Peripheral_Function := C; PB26_SERCOM2_PAD0 : constant Peripheral_Function := C; PA08_SERCOM2_PAD1 : constant Peripheral_Function := D; PB24_SERCOM2_PAD1 : constant Peripheral_Function := D; PA13_SERCOM2_PAD1 : constant Peripheral_Function := C; PB27_SERCOM2_PAD1 : constant Peripheral_Function := C; PA10_SERCOM2_PAD2 : constant Peripheral_Function := D; PC24_SERCOM2_PAD2 : constant Peripheral_Function := D; PB28_SERCOM2_PAD2 : constant Peripheral_Function := C; PA14_SERCOM2_PAD2 : constant Peripheral_Function := C; PA11_SERCOM2_PAD3 : constant Peripheral_Function := D; PC25_SERCOM2_PAD3 : constant Peripheral_Function := D; PB29_SERCOM2_PAD3 : constant Peripheral_Function := C; PA15_SERCOM2_PAD3 : constant Peripheral_Function := C; PA17_SERCOM3_PAD0 : constant Peripheral_Function := D; PC23_SERCOM3_PAD0 : constant Peripheral_Function := D; PA22_SERCOM3_PAD0 : constant Peripheral_Function := C; PB20_SERCOM3_PAD0 : constant Peripheral_Function := C; PA16_SERCOM3_PAD1 : constant Peripheral_Function := D; PC22_SERCOM3_PAD1 : constant Peripheral_Function := D; PA23_SERCOM3_PAD1 : constant Peripheral_Function := C; PB21_SERCOM3_PAD1 : constant Peripheral_Function := C; PA18_SERCOM3_PAD2 : constant Peripheral_Function := D; PA20_SERCOM3_PAD2 : constant Peripheral_Function := D; PD20_SERCOM3_PAD2 : constant Peripheral_Function := D; PA24_SERCOM3_PAD2 : constant Peripheral_Function := C; PA19_SERCOM3_PAD3 : constant Peripheral_Function := D; PA21_SERCOM3_PAD3 : constant Peripheral_Function := D; PD21_SERCOM3_PAD3 : constant Peripheral_Function := D; PA25_SERCOM3_PAD3 : constant Peripheral_Function := C; PA13_SERCOM4_PAD0 : constant Peripheral_Function := D; PB08_SERCOM4_PAD0 : constant Peripheral_Function := D; PB27_SERCOM4_PAD0 : constant Peripheral_Function := D; PB12_SERCOM4_PAD0 : constant Peripheral_Function := C; PA12_SERCOM4_PAD1 : constant Peripheral_Function := D; PB09_SERCOM4_PAD1 : constant Peripheral_Function := D; PB26_SERCOM4_PAD1 : constant Peripheral_Function := D; PB13_SERCOM4_PAD1 : constant Peripheral_Function := C; PA14_SERCOM4_PAD2 : constant Peripheral_Function := D; PB10_SERCOM4_PAD2 : constant Peripheral_Function := D; PB28_SERCOM4_PAD2 : constant Peripheral_Function := D; PB14_SERCOM4_PAD2 : constant Peripheral_Function := C; PB11_SERCOM4_PAD3 : constant Peripheral_Function := D; PB29_SERCOM4_PAD3 : constant Peripheral_Function := D; PA15_SERCOM4_PAD3 : constant Peripheral_Function := D; PB15_SERCOM4_PAD3 : constant Peripheral_Function := C; PA23_SERCOM5_PAD0 : constant Peripheral_Function := D; PB02_SERCOM5_PAD0 : constant Peripheral_Function := D; PB31_SERCOM5_PAD0 : constant Peripheral_Function := D; PB16_SERCOM5_PAD0 : constant Peripheral_Function := C; PA22_SERCOM5_PAD1 : constant Peripheral_Function := D; PB03_SERCOM5_PAD1 : constant Peripheral_Function := D; PB30_SERCOM5_PAD1 : constant Peripheral_Function := D; PB17_SERCOM5_PAD1 : constant Peripheral_Function := C; PA24_SERCOM5_PAD2 : constant Peripheral_Function := D; PB00_SERCOM5_PAD2 : constant Peripheral_Function := D; PB22_SERCOM5_PAD2 : constant Peripheral_Function := D; PA20_SERCOM5_PAD2 : constant Peripheral_Function := C; PB18_SERCOM5_PAD2 : constant Peripheral_Function := C; PA25_SERCOM5_PAD3 : constant Peripheral_Function := D; PB01_SERCOM5_PAD3 : constant Peripheral_Function := D; PB23_SERCOM5_PAD3 : constant Peripheral_Function := D; PA21_SERCOM5_PAD3 : constant Peripheral_Function := C; PB19_SERCOM5_PAD3 : constant Peripheral_Function := C; PD09_SERCOM6_PAD0 : constant Peripheral_Function := D; PC13_SERCOM6_PAD0 : constant Peripheral_Function := D; PC04_SERCOM6_PAD0 : constant Peripheral_Function := C; PC16_SERCOM6_PAD0 : constant Peripheral_Function := C; PD08_SERCOM6_PAD1 : constant Peripheral_Function := D; PC12_SERCOM6_PAD1 : constant Peripheral_Function := D; PC05_SERCOM6_PAD1 : constant Peripheral_Function := C; PC17_SERCOM6_PAD1 : constant Peripheral_Function := C; PC14_SERCOM6_PAD2 : constant Peripheral_Function := D; PD10_SERCOM6_PAD2 : constant Peripheral_Function := D; PC06_SERCOM6_PAD2 : constant Peripheral_Function := C; PC10_SERCOM6_PAD2 : constant Peripheral_Function := C; PC18_SERCOM6_PAD2 : constant Peripheral_Function := C; PC15_SERCOM6_PAD3 : constant Peripheral_Function := D; PD11_SERCOM6_PAD3 : constant Peripheral_Function := D; PC07_SERCOM6_PAD3 : constant Peripheral_Function := C; PC11_SERCOM6_PAD3 : constant Peripheral_Function := C; PC19_SERCOM6_PAD3 : constant Peripheral_Function := C; PB21_SERCOM7_PAD0 : constant Peripheral_Function := D; PD08_SERCOM7_PAD0 : constant Peripheral_Function := C; PB30_SERCOM7_PAD0 : constant Peripheral_Function := C; PC12_SERCOM7_PAD0 : constant Peripheral_Function := C; PB20_SERCOM7_PAD1 : constant Peripheral_Function := D; PD09_SERCOM7_PAD1 : constant Peripheral_Function := C; PB31_SERCOM7_PAD1 : constant Peripheral_Function := C; PC13_SERCOM7_PAD1 : constant Peripheral_Function := C; PB18_SERCOM7_PAD2 : constant Peripheral_Function := D; PC10_SERCOM7_PAD2 : constant Peripheral_Function := D; PC14_SERCOM7_PAD2 : constant Peripheral_Function := C; PD10_SERCOM7_PAD2 : constant Peripheral_Function := C; PA30_SERCOM7_PAD2 : constant Peripheral_Function := C; PB19_SERCOM7_PAD3 : constant Peripheral_Function := D; PC11_SERCOM7_PAD3 : constant Peripheral_Function := D; PC15_SERCOM7_PAD3 : constant Peripheral_Function := C; PD11_SERCOM7_PAD3 : constant Peripheral_Function := C; PA31_SERCOM7_PAD3 : constant Peripheral_Function := C; PA04_TC0_WO0 : constant Peripheral_Function := E; PA08_TC0_WO0 : constant Peripheral_Function := E; PB30_TC0_WO0 : constant Peripheral_Function := E; PA05_TC0_WO1 : constant Peripheral_Function := E; PA09_TC0_WO1 : constant Peripheral_Function := E; PB31_TC0_WO1 : constant Peripheral_Function := E; PA06_TC1_WO0 : constant Peripheral_Function := E; PA10_TC1_WO0 : constant Peripheral_Function := E; PA07_TC1_WO1 : constant Peripheral_Function := E; PA11_TC1_WO1 : constant Peripheral_Function := E; PA12_TC2_WO0 : constant Peripheral_Function := E; PA16_TC2_WO0 : constant Peripheral_Function := E; PA00_TC2_WO0 : constant Peripheral_Function := E; PA01_TC2_WO1 : constant Peripheral_Function := E; PA13_TC2_WO1 : constant Peripheral_Function := E; PA17_TC2_WO1 : constant Peripheral_Function := E; PA18_TC3_WO0 : constant Peripheral_Function := E; PA14_TC3_WO0 : constant Peripheral_Function := E; PA15_TC3_WO1 : constant Peripheral_Function := E; PA19_TC3_WO1 : constant Peripheral_Function := E; PA22_TC4_WO0 : constant Peripheral_Function := E; PB08_TC4_WO0 : constant Peripheral_Function := E; PB12_TC4_WO0 : constant Peripheral_Function := E; PA23_TC4_WO1 : constant Peripheral_Function := E; PB09_TC4_WO1 : constant Peripheral_Function := E; PB13_TC4_WO1 : constant Peripheral_Function := E; PA24_TC5_WO0 : constant Peripheral_Function := E; PB10_TC5_WO0 : constant Peripheral_Function := E; PB14_TC5_WO0 : constant Peripheral_Function := E; PA25_TC5_WO1 : constant Peripheral_Function := E; PB11_TC5_WO1 : constant Peripheral_Function := E; PB15_TC5_WO1 : constant Peripheral_Function := E; PA30_TC6_WO0 : constant Peripheral_Function := E; PB02_TC6_WO0 : constant Peripheral_Function := E; PB16_TC6_WO0 : constant Peripheral_Function := E; PA31_TC6_WO1 : constant Peripheral_Function := E; PB03_TC6_WO1 : constant Peripheral_Function := E; PB17_TC6_WO1 : constant Peripheral_Function := E; PA20_TC7_WO0 : constant Peripheral_Function := E; PB00_TC7_WO0 : constant Peripheral_Function := E; PB22_TC7_WO0 : constant Peripheral_Function := E; PA21_TC7_WO1 : constant Peripheral_Function := E; PB01_TC7_WO1 : constant Peripheral_Function := E; PB23_TC7_WO1 : constant Peripheral_Function := E; PA20_TCC0_WO0 : constant Peripheral_Function := G; PB12_TCC0_WO0 : constant Peripheral_Function := G; PA08_TCC0_WO0 : constant Peripheral_Function := F; PC04_TCC0_WO0 : constant Peripheral_Function := F; PC10_TCC0_WO0 : constant Peripheral_Function := F; PC16_TCC0_WO0 : constant Peripheral_Function := F; PA21_TCC0_WO1 : constant Peripheral_Function := G; PB13_TCC0_WO1 : constant Peripheral_Function := G; PA09_TCC0_WO1 : constant Peripheral_Function := F; PC11_TCC0_WO1 : constant Peripheral_Function := F; PC17_TCC0_WO1 : constant Peripheral_Function := F; PD08_TCC0_WO1 : constant Peripheral_Function := F; PA22_TCC0_WO2 : constant Peripheral_Function := G; PB14_TCC0_WO2 : constant Peripheral_Function := G; PA10_TCC0_WO2 : constant Peripheral_Function := F; PC12_TCC0_WO2 : constant Peripheral_Function := F; PC18_TCC0_WO2 : constant Peripheral_Function := F; PD09_TCC0_WO2 : constant Peripheral_Function := F; PA23_TCC0_WO3 : constant Peripheral_Function := G; PB15_TCC0_WO3 : constant Peripheral_Function := G; PA11_TCC0_WO3 : constant Peripheral_Function := F; PC13_TCC0_WO3 : constant Peripheral_Function := F; PC19_TCC0_WO3 : constant Peripheral_Function := F; PD10_TCC0_WO3 : constant Peripheral_Function := F; PA16_TCC0_WO4 : constant Peripheral_Function := G; PB16_TCC0_WO4 : constant Peripheral_Function := G; PB10_TCC0_WO4 : constant Peripheral_Function := F; PC14_TCC0_WO4 : constant Peripheral_Function := F; PC20_TCC0_WO4 : constant Peripheral_Function := F; PD11_TCC0_WO4 : constant Peripheral_Function := F; PA17_TCC0_WO5 : constant Peripheral_Function := G; PB17_TCC0_WO5 : constant Peripheral_Function := G; PB11_TCC0_WO5 : constant Peripheral_Function := F; PC15_TCC0_WO5 : constant Peripheral_Function := F; PC21_TCC0_WO5 : constant Peripheral_Function := F; PD12_TCC0_WO5 : constant Peripheral_Function := F; PA18_TCC0_WO6 : constant Peripheral_Function := G; PB30_TCC0_WO6 : constant Peripheral_Function := G; PA12_TCC0_WO6 : constant Peripheral_Function := F; PC22_TCC0_WO6 : constant Peripheral_Function := F; PA19_TCC0_WO7 : constant Peripheral_Function := G; PB31_TCC0_WO7 : constant Peripheral_Function := G; PA13_TCC0_WO7 : constant Peripheral_Function := F; PC23_TCC0_WO7 : constant Peripheral_Function := F; PB10_TCC1_WO0 : constant Peripheral_Function := G; PC14_TCC1_WO0 : constant Peripheral_Function := G; PA16_TCC1_WO0 : constant Peripheral_Function := F; PB18_TCC1_WO0 : constant Peripheral_Function := F; PD20_TCC1_WO0 : constant Peripheral_Function := F; PB11_TCC1_WO1 : constant Peripheral_Function := G; PC15_TCC1_WO1 : constant Peripheral_Function := G; PA17_TCC1_WO1 : constant Peripheral_Function := F; PB19_TCC1_WO1 : constant Peripheral_Function := F; PD21_TCC1_WO1 : constant Peripheral_Function := F; PA12_TCC1_WO2 : constant Peripheral_Function := G; PA14_TCC1_WO2 : constant Peripheral_Function := G; PA18_TCC1_WO2 : constant Peripheral_Function := F; PB20_TCC1_WO2 : constant Peripheral_Function := F; PB26_TCC1_WO2 : constant Peripheral_Function := F; PA13_TCC1_WO3 : constant Peripheral_Function := G; PA15_TCC1_WO3 : constant Peripheral_Function := G; PA19_TCC1_WO3 : constant Peripheral_Function := F; PB21_TCC1_WO3 : constant Peripheral_Function := F; PB27_TCC1_WO3 : constant Peripheral_Function := F; PA08_TCC1_WO4 : constant Peripheral_Function := G; PC10_TCC1_WO4 : constant Peripheral_Function := G; PA20_TCC1_WO4 : constant Peripheral_Function := F; PB28_TCC1_WO4 : constant Peripheral_Function := F; PA09_TCC1_WO5 : constant Peripheral_Function := G; PC11_TCC1_WO5 : constant Peripheral_Function := G; PA21_TCC1_WO5 : constant Peripheral_Function := F; PB29_TCC1_WO5 : constant Peripheral_Function := F; PA10_TCC1_WO6 : constant Peripheral_Function := G; PC12_TCC1_WO6 : constant Peripheral_Function := G; PA22_TCC1_WO6 : constant Peripheral_Function := F; PA11_TCC1_WO7 : constant Peripheral_Function := G; PC13_TCC1_WO7 : constant Peripheral_Function := G; PA23_TCC1_WO7 : constant Peripheral_Function := F; PA14_TCC2_WO0 : constant Peripheral_Function := F; PA30_TCC2_WO0 : constant Peripheral_Function := F; PA15_TCC2_WO1 : constant Peripheral_Function := F; PA31_TCC2_WO1 : constant Peripheral_Function := F; PA24_TCC2_WO2 : constant Peripheral_Function := F; PB02_TCC2_WO2 : constant Peripheral_Function := F; PB12_TCC3_WO0 : constant Peripheral_Function := F; PB16_TCC3_WO0 : constant Peripheral_Function := F; PB13_TCC3_WO1 : constant Peripheral_Function := F; PB17_TCC3_WO1 : constant Peripheral_Function := F; PB14_TCC4_WO0 : constant Peripheral_Function := F; PB30_TCC4_WO0 : constant Peripheral_Function := F; PB15_TCC4_WO1 : constant Peripheral_Function := F; PB31_TCC4_WO1 : constant Peripheral_Function := F; PA24_USB_DM : constant Peripheral_Function := H; PA25_USB_DP : constant Peripheral_Function := H; PA23_USB_SOF_1KHZ : constant Peripheral_Function := H; PB22_USB_SOF_1KHZ : constant Peripheral_Function := H; end SAM.Functions;
AdaCore/gpr
Ada
48
adb
package body Ada_Pkg is null; end Ada_Pkg;
reznikmm/matreshka
Ada
6,096
ads
------------------------------------------------------------------------------ -- -- -- Matreshka Project -- -- -- -- Localization, Internationalization, Globalization for Ada -- -- -- -- Runtime Library Component -- -- -- ------------------------------------------------------------------------------ -- -- -- Copyright © 2010 Vadim Godunko <[email protected]> -- -- -- -- Matreshka is free software; you can redistribute it and/or modify it -- -- under terms of the GNU General Public License as published by the Free -- -- Software Foundation; either version 2, or (at your option) any later -- -- version. Matreshka is distributed in the hope that it will be useful, -- -- but WITHOUT ANY WARRANTY; without even the implied warranty of -- -- MERCHANTABILITY or FITNESS FOR A PARTICULAR PURPOSE. See the GNU General -- -- Public License for more details. You should have received a copy of the -- -- GNU General Public License distributed with Matreshka; see file COPYING. -- -- If not, write to the Free Software Foundation, 51 Franklin Street, -- -- Fifth Floor, Boston, MA 02110-1301, USA. -- -- -- -- As a special exception, if other files instantiate generics from this -- -- unit, or you link this unit with other files to produce an executable, -- -- this unit does not by itself cause the resulting executable to be -- -- covered by the GNU General Public License. This exception does not -- -- however invalidate any other reasons why the executable file might be -- -- covered by the GNU Public License. -- -- -- ------------------------------------------------------------------------------ -- $Revision$ $Date$ ------------------------------------------------------------------------------ -- This package provides access to SSE instruction set. ------------------------------------------------------------------------------ with Interfaces; package Matreshka.Internals.SIMD.Intel.SSE is pragma Preelaborate; function mm_extract (A : Unsigned_16_Vector_4; N : Interfaces.Unsigned_32) return Interfaces.Unsigned_16; -- function mm_extract_pi16 -- (A : Integer_16_Vector_4; -- N : Unsigned_32) return Integer_16; private -- _mm_setzero_ps -- _mm_add_ss -- _mm_sub_ss -- _mm_mul_ss -- _mm_div_ss -- _mm_sqrt_ss -- _mm_rcp_ss -- _mm_rsqrt_ss -- _mm_min_ss -- _mm_max_ss -- _mm_add_ps -- _mm_sub_ps -- _mm_mul_ps -- _mm_div_ps -- _mm_sqrt_ps -- _mm_rcp_ps -- _mm_rsqrt_ps -- _mm_min_ps -- _mm_max_ps -- _mm_and_ps -- _mm_andnot_ps -- _mm_or_ps -- _mm_xor_ps -- _mm_cmpeq_ss -- _mm_cmplt_ss -- _mm_cmple_ss -- _mm_cmpgt_ss -- _mm_cmpge_ss -- _mm_cmpneq_ss -- _mm_cmpnlt_ss -- _mm_cmpnle_ss -- _mm_cmpngt_ss -- _mm_cmpnge_ss -- _mm_cmpord_ss -- _mm_cmpunord_ss -- _mm_cmpeq_ps -- _mm_cmplt_ps -- _mm_cmple_ps -- _mm_cmpgt_ps -- _mm_cmpge_ps -- _mm_cmpneq_ps -- _mm_cmpnlt_ps -- _mm_cmpnle_ps -- _mm_cmpngt_ps -- _mm_cmpnge_ps -- _mm_cmpord_ps -- _mm_cmpunord_ps -- _mm_comieq_ss -- _mm_comilt_ss -- _mm_comile_ss -- _mm_comigt_ss -- _mm_comige_ss -- _mm_comineq_ss -- _mm_ucomieq_ss -- _mm_ucomilt_ss -- _mm_ucomile_ss -- _mm_ucomigt_ss -- _mm_ucomige_ss -- _mm_ucomineq_ss -- _mm_cvtss_si32 -- _mm_cvt_ss2si -- _mm_cvtss_si64 x86_64, Intel -- _mm_cvtss_si64x x86_64, Microsoft -- _mm_cvtps_pi32 -- _mm_cvt_ps2pi -- _mm_cvttss_si32 -- _mm_cvtt_ss2si -- _mm_cvttss_si64 x86_64, Intel -- _mm_cvttss_si64x x86_64, Microsoft -- _mm_cvttps_pi32 -- _mm_cvtt_ps2pi -- _mm_cvtsi32_ss -- _mm_cvt_si2ss -- _mm_cvtsi64_ss x86_64, Intel -- _mm_cvtsi64x_ss x86_64, Microsoft -- _mm_cvtpi32_ps -- _mm_cvt_pi2ps -- _mm_cvtpi16_ps -- _mm_cvtpu16_ps -- _mm_cvtpi8_ps -- _mm_cvtpu8_ps -- _mm_cvtpi32x2_ps -- _mm_cvtps_pi16 -- _mm_cvtps_pi8 -- _mm_shuffle_ps -- _mm_unpackhi_ps -- _mm_unpacklo_ps -- _mm_loadh_pi -- _mm_storeh_pi -- _mm_movehl_ps -- _mm_movelh_ps -- _mm_loadl_pi -- _mm_storel_pi -- _mm_movemask_ps -- _mm_getcsr -- _MM_GET_EXCEPTION_STATE -- _MM_GET_EXCEPTION_MASK -- _MM_GET_ROUNDING_MODE -- _MM_GET_FLUSH_ZERO_MODE -- _mm_setcsr -- _MM_SET_EXCEPTION_STATE -- _MM_SET_EXCEPTION_MASK -- _MM_SET_ROUNDING_MODE -- _MM_SET_FLUSH_ZERO_MODE -- _mm_set_ss -- _mm_set1_ps -- _mm_set_ps1 -- _mm_load_ss -- _mm_load1_ps -- _mm_load_ps1 -- _mm_load_ps -- _mm_loadu_ps -- _mm_loadr_ps -- _mm_set_ps -- _mm_setr_ps -- _mm_store_ss -- _mm_cvtss_f32 -- _mm_store_ps -- _mm_storeu_ps -- _mm_store1_ps -- _mm_store_ps1 -- _mm_storer_ps -- _mm_move_ss -- + _mm_extract_pi16 -- _mm_insert_pi16 -- _mm_max_pi16 -- _mm_max_pu8 -- _mm_min_pi16 -- _mm_min_pu8 -- _mm_movemask_pi8 -- _mm_mulhi_pu16 -- _mm_shuffle_pi16 -- _mm_maskmove_si64 -- _mm_avg_pu8 -- _mm_avg_pu16 -- _mm_sad_pu8 -- _mm_prefetch -- _mm_stream_pi -- _mm_stream_ps -- _mm_sfence -- _mm_pause -- _MM_TRANSPOSE4_PS pragma Inline (mm_extract); pragma Inline_Always (mm_extract); end Matreshka.Internals.SIMD.Intel.SSE;
reznikmm/matreshka
Ada
3,609
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.Message_Ends.Hash is new AMF.Elements.Generic_Hash (UML_Message_End, UML_Message_End_Access);
AdaCore/libadalang
Ada
266
adb
procedure Test is protected type PT is entry E; end PT; function F return Integer is (42); protected body PT is entry E when F = 42 is begin null; end E; pragma Test_Statement; end PT; begin null; end Test;
charlesdaniels/libagar
Ada
1,884
adb
------------------------------------------------------------------------------ -- AGAR GUI LIBRARY -- -- A G A R . I N I T _ G U I -- -- B o d y -- -- -- -- Copyright (c) 2018-2019 Julien Nadeau Carriere ([email protected]) -- -- -- -- Permission to use, copy, modify, and/or distribute this software for any -- -- purpose with or without fee is hereby granted, provided that the above -- -- copyright notice and this permission notice appear in all copies. -- -- -- -- THE SOFTWARE IS PROVIDED "AS IS" AND THE AUTHOR DISCLAIMS ALL WARRANTIES -- -- WITH REGARD TO THIS SOFTWARE INCLUDING ALL IMPLIED WARRANTIES OF -- -- MERCHANTABILITY AND FITNESS. IN NO EVENT SHALL THE AUTHOR BE LIABLE FOR -- -- ANY SPECIAL, DIRECT, INDIRECT, OR CONSEQUENTIAL DAMAGES OR ANY DAMAGES -- -- WHATSOEVER RESULTING FROM LOSS OF USE, DATA OR PROFITS, WHETHER IN AN -- -- ACTION OF CONTRACT, NEGLIGENCE OR OTHER TORTIOUS ACTION, ARISING OUT OF -- -- OR IN CONNECTION WITH THE USE OR PERFORMANCE OF THIS SOFTWARE. -- ------------------------------------------------------------------------------ package body Agar.Init_GUI is function Init_Graphics (Driver : in String) return Boolean is Ch_Driver : aliased C.char_array := C.To_C(Driver); begin return 0 = AG_InitGraphics (Driver => CS.To_Chars_Ptr(Ch_Driver'Unchecked_Access)); end; function Init_GUI return Boolean is begin return 0 = AG_InitGUI (Flags => 0); end; end Agar.Init_GUI;
zhmu/ananas
Ada
20,123
adb
------------------------------------------------------------------------------ -- -- -- GNAT RUN-TIME COMPONENTS -- -- -- -- A D A . S T R I N G S . M A P S -- -- -- -- B o d y -- -- -- -- 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. -- -- -- -- 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. -- -- -- ------------------------------------------------------------------------------ -- Note: parts of this code are derived from the ADAR.CSH public domain -- Ada 83 versions of the Appendix C string handling packages. The main -- differences are that we avoid the use of the minimize function which -- is bit-by-bit or character-by-character and therefore rather slow. -- Generally for character sets we favor the full 32-byte representation. -- Assertions, ghost code and loop invariants in this unit are meant for -- analysis only, not for run-time checking, as it would be too costly -- otherwise. This is enforced by setting the assertion policy to Ignore. pragma Assertion_Policy (Assert => Ignore, Ghost => Ignore, Loop_Invariant => Ignore); package body Ada.Strings.Maps with SPARK_Mode is --------- -- "-" -- --------- function "-" (Left, Right : Character_Set) return Character_Set is begin return Left and not Right; end "-"; --------- -- "=" -- --------- function "=" (Left, Right : Character_Set) return Boolean is begin return Character_Set_Internal (Left) = Character_Set_Internal (Right); end "="; ----------- -- "and" -- ----------- function "and" (Left, Right : Character_Set) return Character_Set is begin return Character_Set (Character_Set_Internal (Left) and Character_Set_Internal (Right)); end "and"; ----------- -- "not" -- ----------- function "not" (Right : Character_Set) return Character_Set is begin return Character_Set (not Character_Set_Internal (Right)); end "not"; ---------- -- "or" -- ---------- function "or" (Left, Right : Character_Set) return Character_Set is begin return Character_Set (Character_Set_Internal (Left) or Character_Set_Internal (Right)); end "or"; ----------- -- "xor" -- ----------- function "xor" (Left, Right : Character_Set) return Character_Set is begin return Character_Set (Character_Set_Internal (Left) xor Character_Set_Internal (Right)); end "xor"; ----------- -- Is_In -- ----------- function Is_In (Element : Character; Set : Character_Set) return Boolean is (Set (Element)); --------------- -- Is_Subset -- --------------- function Is_Subset (Elements : Character_Set; Set : Character_Set) return Boolean is begin return (Elements and Set) = Elements; end Is_Subset; --------------- -- To_Domain -- --------------- function To_Domain (Map : Character_Mapping) return Character_Sequence is Result : String (1 .. Map'Length) with Relaxed_Initialization; J : Natural; type Character_Index is array (Character) of Natural with Ghost; Indexes : Character_Index := [others => 0] with Ghost; begin J := 0; for C in Map'Range loop if Map (C) /= C then J := J + 1; Result (J) := C; Indexes (C) := J; end if; pragma Loop_Invariant (if Map = Identity then J = 0); pragma Loop_Invariant (J <= Character'Pos (C) + 1); pragma Loop_Invariant (Result (1 .. J)'Initialized); pragma Loop_Invariant (for all K in 1 .. J => Result (K) <= C); pragma Loop_Invariant (SPARK_Proof_Sorted_Character_Sequence (Result (1 .. J))); pragma Loop_Invariant (for all D in Map'First .. C => (if Map (D) = D then Indexes (D) = 0 else Indexes (D) in 1 .. J and then Result (Indexes (D)) = D)); pragma Loop_Invariant (for all Char of Result (1 .. J) => Map (Char) /= Char); end loop; return Result (1 .. J); end To_Domain; ---------------- -- To_Mapping -- ---------------- function To_Mapping (From, To : Character_Sequence) return Character_Mapping is Result : Character_Mapping with Relaxed_Initialization; Inserted : Character_Set := Null_Set; From_Len : constant Natural := From'Length; To_Len : constant Natural := To'Length; begin if From_Len /= To_Len then raise Strings.Translation_Error; end if; for Char in Character loop Result (Char) := Char; pragma Loop_Invariant (Result (Result'First .. Char)'Initialized); pragma Loop_Invariant (for all C in Result'First .. Char => Result (C) = C); end loop; for J in From'Range loop if Inserted (From (J)) then raise Strings.Translation_Error; end if; Result (From (J)) := To (J - From'First + To'First); Inserted (From (J)) := True; pragma Loop_Invariant (Result'Initialized); pragma Loop_Invariant (for all K in From'First .. J => Result (From (K)) = To (K - From'First + To'First) and then Inserted (From (K))); pragma Loop_Invariant (for all Char in Character => (Inserted (Char) = (for some K in From'First .. J => Char = From (K)))); pragma Loop_Invariant (for all Char in Character => (if not Inserted (Char) then Result (Char) = Char)); pragma Loop_Invariant (if (for all K in From'First .. J => From (K) = To (J - From'First + To'First)) then Result = Identity); end loop; return Result; end To_Mapping; -------------- -- To_Range -- -------------- function To_Range (Map : Character_Mapping) return Character_Sequence is -- Extract from the postcondition of To_Domain the essential properties -- that define Seq as the domain of Map. function Is_Domain (Map : Character_Mapping; Seq : Character_Sequence) return Boolean is (Seq'First = 1 and then SPARK_Proof_Sorted_Character_Sequence (Seq) and then (for all Char in Character => (if (for all X of Seq => X /= Char) then Map (Char) = Char)) and then (for all Char of Seq => Map (Char) /= Char)) with Ghost; -- Given Map, there is a unique sequence Seq for which -- Is_Domain(Map,Seq) holds. procedure Lemma_Domain_Unicity (Map : Character_Mapping; Seq1, Seq2 : Character_Sequence) with Ghost, Pre => Is_Domain (Map, Seq1) and then Is_Domain (Map, Seq2), Post => Seq1 = Seq2; -- Isolate the proof that To_Domain(Map) returns a sequence for which -- Is_Domain holds. procedure Lemma_Is_Domain (Map : Character_Mapping) with Ghost, Post => Is_Domain (Map, To_Domain (Map)); -- Deduce the alternative expression of sortedness from the one in -- SPARK_Proof_Sorted_Character_Sequence which compares consecutive -- elements. procedure Lemma_Is_Sorted (Seq : Character_Sequence) with Ghost, Pre => SPARK_Proof_Sorted_Character_Sequence (Seq), Post => (for all J in Seq'Range => (for all K in Seq'Range => (if J < K then Seq (J) < Seq (K)))); -------------------------- -- Lemma_Domain_Unicity -- -------------------------- procedure Lemma_Domain_Unicity (Map : Character_Mapping; Seq1, Seq2 : Character_Sequence) is J : Positive := 1; begin while J <= Seq1'Last and then J <= Seq2'Last and then Seq1 (J) = Seq2 (J) loop pragma Loop_Invariant (Seq1 (Seq1'First .. J) = Seq2 (Seq2'First .. J)); if J = Positive'Last then return; end if; J := J + 1; end loop; Lemma_Is_Sorted (Seq1); Lemma_Is_Sorted (Seq2); if J <= Seq1'Last and then J <= Seq2'Last then if Seq1 (J) < Seq2 (J) then pragma Assert (for all X of Seq2 => X /= Seq1 (J)); pragma Assert (Map (Seq1 (J)) = Seq1 (J)); pragma Assert (False); else pragma Assert (for all X of Seq1 => X /= Seq2 (J)); pragma Assert (Map (Seq2 (J)) = Seq2 (J)); pragma Assert (False); end if; elsif J <= Seq1'Last then pragma Assert (for all X of Seq2 => X /= Seq1 (J)); pragma Assert (Map (Seq1 (J)) = Seq1 (J)); pragma Assert (False); elsif J <= Seq2'Last then pragma Assert (for all X of Seq1 => X /= Seq2 (J)); pragma Assert (Map (Seq2 (J)) = Seq2 (J)); pragma Assert (False); end if; end Lemma_Domain_Unicity; --------------------- -- Lemma_Is_Domain -- --------------------- procedure Lemma_Is_Domain (Map : Character_Mapping) is Ignore : constant Character_Sequence := To_Domain (Map); begin null; end Lemma_Is_Domain; --------------------- -- Lemma_Is_Sorted -- --------------------- procedure Lemma_Is_Sorted (Seq : Character_Sequence) is begin for A in Seq'Range loop exit when A = Positive'Last; for B in A + 1 .. Seq'Last loop pragma Loop_Invariant (for all K in A + 1 .. B => Seq (A) < Seq (K)); end loop; pragma Loop_Invariant (for all J in Seq'First .. A => (for all K in Seq'Range => (if J < K then Seq (J) < Seq (K)))); end loop; end Lemma_Is_Sorted; -- Local variables Result : String (1 .. Map'Length) with Relaxed_Initialization; J : Natural; -- Repeat the computation from To_Domain in ghost code, in order to -- prove the relationship between Result and To_Domain(Map). Domain : String (1 .. Map'Length) with Ghost, Relaxed_Initialization; type Character_Index is array (Character) of Natural with Ghost; Indexes : Character_Index := [others => 0] with Ghost; -- Start of processing for To_Range begin J := 0; for C in Map'Range loop if Map (C) /= C then J := J + 1; Result (J) := Map (C); Domain (J) := C; Indexes (C) := J; end if; -- Repeat the loop invariants from To_Domain regarding Domain and -- Indexes. Add similar loop invariants for Result and Indexes. pragma Loop_Invariant (J <= Character'Pos (C) + 1); pragma Loop_Invariant (Result (1 .. J)'Initialized); pragma Loop_Invariant (Domain (1 .. J)'Initialized); pragma Loop_Invariant (for all K in 1 .. J => Domain (K) <= C); pragma Loop_Invariant (SPARK_Proof_Sorted_Character_Sequence (Domain (1 .. J))); pragma Loop_Invariant (for all D in Map'First .. C => (if Map (D) = D then Indexes (D) = 0 else Indexes (D) in 1 .. J and then Domain (Indexes (D)) = D and then Result (Indexes (D)) = Map (D))); pragma Loop_Invariant (for all Char of Domain (1 .. J) => Map (Char) /= Char); pragma Loop_Invariant (for all K in 1 .. J => Result (K) = Map (Domain (K))); end loop; -- Show the equality of Domain and To_Domain(Map) Lemma_Is_Domain (Map); Lemma_Domain_Unicity (Map, Domain (1 .. J), To_Domain (Map)); pragma Assert (for all K in 1 .. J => Domain (K) = To_Domain (Map) (K)); pragma Assert (To_Domain (Map)'Length = J); return Result (1 .. J); end To_Range; --------------- -- To_Ranges -- --------------- function To_Ranges (Set : Character_Set) return Character_Ranges is Max_Ranges : Character_Ranges (1 .. Set'Length / 2 + 1) with Relaxed_Initialization; Range_Num : Natural; C : Character; C_Iter : Character with Ghost; begin C := Character'First; Range_Num := 0; loop C_Iter := C; -- Skip gap between subsets while not Set (C) loop pragma Loop_Invariant (Character'Pos (C) >= Character'Pos (C'Loop_Entry)); pragma Loop_Invariant (for all Char in C'Loop_Entry .. C => not Set (Char)); exit when C = Character'Last; C := Character'Succ (C); end loop; exit when not Set (C); Range_Num := Range_Num + 1; Max_Ranges (Range_Num).Low := C; -- Span a subset loop pragma Loop_Invariant (Character'Pos (C) >= Character'Pos (C'Loop_Entry)); pragma Loop_Invariant (for all Char in C'Loop_Entry .. C => (if Char /= C then Set (Char))); exit when not Set (C) or else C = Character'Last; C := Character'Succ (C); end loop; if Set (C) then Max_Ranges (Range_Num).High := C; exit; else Max_Ranges (Range_Num).High := Character'Pred (C); end if; pragma Assert (for all Char in C_Iter .. C => (Set (Char) = (Char in Max_Ranges (Range_Num).Low .. Max_Ranges (Range_Num).High))); pragma Assert (for all Char in Character'First .. C_Iter => (if Char /= C_Iter then (Set (Char) = (for some Span of Max_Ranges (1 .. Range_Num - 1) => Char in Span.Low .. Span.High)))); pragma Loop_Invariant (2 * Range_Num <= Character'Pos (C) + 1); pragma Loop_Invariant (Max_Ranges (1 .. Range_Num)'Initialized); pragma Loop_Invariant (not Set (C)); pragma Loop_Invariant (for all Char in Character'First .. C => (Set (Char) = (for some Span of Max_Ranges (1 .. Range_Num) => Char in Span.Low .. Span.High))); pragma Loop_Invariant (for all Span of Max_Ranges (1 .. Range_Num) => (for all Char in Span.Low .. Span.High => Set (Char))); end loop; return Max_Ranges (1 .. Range_Num); end To_Ranges; ----------------- -- To_Sequence -- ----------------- function To_Sequence (Set : Character_Set) return Character_Sequence is Result : String (1 .. Character'Pos (Character'Last) + 1) with Relaxed_Initialization; Count : Natural := 0; begin for Char in Set'Range loop if Set (Char) then Count := Count + 1; Result (Count) := Char; end if; pragma Loop_Invariant (Count <= Character'Pos (Char) + 1); pragma Loop_Invariant (Result (1 .. Count)'Initialized); pragma Loop_Invariant (for all K in 1 .. Count => Result (K) <= Char); pragma Loop_Invariant (SPARK_Proof_Sorted_Character_Sequence (Result (1 .. Count))); pragma Loop_Invariant (for all C in Set'First .. Char => (Set (C) = (for some X of Result (1 .. Count) => C = X))); pragma Loop_Invariant (for all Char of Result (1 .. Count) => Is_In (Char, Set)); end loop; return Result (1 .. Count); end To_Sequence; ------------ -- To_Set -- ------------ function To_Set (Ranges : Character_Ranges) return Character_Set is Result : Character_Set := Null_Set; begin for R in Ranges'Range loop for C in Ranges (R).Low .. Ranges (R).High loop Result (C) := True; pragma Loop_Invariant (for all Char in Character => Result (Char) = ((for some Prev in Ranges'First .. R - 1 => Char in Ranges (Prev).Low .. Ranges (Prev).High) or else (Char in Ranges (R).Low .. C))); end loop; pragma Loop_Invariant (for all Char in Character => Result (Char) = (for some Prev in Ranges'First .. R => Char in Ranges (Prev).Low .. Ranges (Prev).High)); end loop; return Result; end To_Set; function To_Set (Span : Character_Range) return Character_Set is Result : Character_Set := Null_Set; begin for C in Span.Low .. Span.High loop Result (C) := True; pragma Loop_Invariant (for all Char in Character => Result (Char) = (Char in Span.Low .. C)); end loop; return Result; end To_Set; function To_Set (Sequence : Character_Sequence) return Character_Set is Result : Character_Set := Null_Set; begin for J in Sequence'Range loop Result (Sequence (J)) := True; pragma Loop_Invariant (for all Char in Character => Result (Char) = (for some K in Sequence'First .. J => Char = Sequence (K))); end loop; return Result; end To_Set; function To_Set (Singleton : Character) return Character_Set is Result : Character_Set := Null_Set; begin Result (Singleton) := True; return Result; end To_Set; ----------- -- Value -- ----------- function Value (Map : Character_Mapping; Element : Character) return Character is (Map (Element)); end Ada.Strings.Maps;
charlie5/lace
Ada
3,077
adb
package body collada.Library.geometries is ----------- --- Utility -- function "+" (From : in ada.Strings.unbounded.unbounded_String) return String renames ada.Strings.unbounded.to_String; ------------- --- Primitive -- function vertex_Offset_of (Self : in Primitive) return math.Index is the_Input : constant Input_t := find_in (Self.Inputs.all, Vertex); begin return math.Index (the_Input.Offset); end vertex_Offset_of; function normal_Offset_of (Self : in Primitive) return math.Index is the_Input : constant Input_t := find_in (Self.Inputs.all, Normal); begin return math.Index (the_Input.Offset); end normal_Offset_of; function coord_Offset_of (Self : in Primitive) return math.Index is the_Input : constant Input_t := find_in (Self.Inputs.all, TexCoord); begin if the_Input = null_Input then raise no_coord_Offset; end if; return math.Index (the_Input.Offset); end coord_Offset_of; -------- --- Mesh -- function Source_of (Self : in Mesh; source_Name : in String) return Source is use ada.Strings.unbounded; begin for i in Self.Sources'Range loop if Self.Sources (i).Id = source_Name (source_Name'First+1 .. source_Name'Last) then return Self.Sources (i); end if; end loop; declare null_Source : Source; begin return null_Source; end; end Source_of; function Positions_of (Self : in Mesh) return access float_Array is the_Input : constant Input_t := find_in (Self.Vertices.Inputs.all, Position); begin if the_Input = null_Input then return null; end if; declare the_Source : constant Source := Source_of (Self, +the_Input.Source); begin return the_Source.Floats; end; end Positions_of; function Normals_of (Self : in Mesh; for_Primitive : in Primitive) return access float_Array is the_Primitive : Primitive renames for_Primitive; the_Input : constant Input_t := find_in (the_Primitive.Inputs.all, Normal); begin if the_Input = null_Input then return null; end if; declare the_Source : constant Source := Source_of (Self, +the_Input.Source); begin return the_Source.Floats; end; end Normals_of; function Coords_of (Self : in Mesh; for_Primitive : in Primitive) return access float_Array is the_Primitive : Primitive renames for_Primitive; the_Input : constant Input_t := find_in (the_Primitive.Inputs.all, TexCoord); begin if the_Input = null_Input then return null; end if; declare the_Source : constant Source := Source_of (Self, +the_Input.Source); begin return the_Source.Floats; end; end Coords_of; end collada.Library.geometries;
thierr26/ada-keystore
Ada
6,365
ads
----------------------------------------------------------------------- -- keystore-keys -- Keystore key management -- 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 Interfaces; with Util.Encoders.AES; with Keystore.IO; with Keystore.Random; with Keystore.Passwords.Keys; with Keystore.Marshallers; private package Keystore.Keys is use type IO.Block_Index; type Cryptor is limited record Cipher : Util.Encoders.AES.Encoder; Decipher : Util.Encoders.AES.Decoder; Key : Secret_Key (Length => 32); IV : Secret_Key (Length => 16); Sign : Secret_Key (Length => 32); end record; -- Set the IV vector to be used for the encryption and decryption of the given block number. procedure Set_IV (Into : in out Cryptor; Block : in IO.Block_Number); procedure Set_Key (Into : in out Cryptor; From : in Cryptor); type Wallet_Config is limited record UUID : UUID_Type; Keys : Key_Slot_Allocation := (others => False); Slot : Key_Slot; Data : Cryptor; Dir : Cryptor; Key : Cryptor; Max_Counter : Interfaces.Unsigned_32 := 300_000; Min_Counter : Interfaces.Unsigned_32 := 100_000; Randomize : Boolean := True; end record; type Key_Manager is limited private; -- Open the key manager and read the wallet header block. Use the secret key -- to decrypt/encrypt the wallet header block. procedure Open (Manager : in out Key_Manager; Password : in out Keystore.Passwords.Provider'Class; Ident : in Wallet_Identifier; Block : in Keystore.IO.Storage_Block; Root : out Keystore.IO.Storage_Block; Config : in out Wallet_Config; Process : access procedure (Buffer : in out Marshallers.Marshaller; Slot : in Key_Slot); Stream : in out IO.Wallet_Stream'Class); -- Create the wallet key block. procedure Create (Manager : in out Key_Manager; Password : in out Passwords.Provider'Class; Slot : in Key_Slot; Ident : in Wallet_Identifier; Block : in Keystore.IO.Storage_Block; Root : in Keystore.IO.Storage_Block; Config : in out Wallet_Config; Stream : in out IO.Wallet_Stream'Class); -- Set a new key procedure Set_Key (Manager : in out Key_Manager; Password : in out Keystore.Passwords.Provider'Class; New_Password : in out Keystore.Passwords.Provider'Class; Config : in Keystore.Wallet_Config; Mode : in Mode_Type; Ident : in Wallet_Identifier; Block : in Keystore.IO.Storage_Block; Stream : in out IO.Wallet_Stream'Class); -- Remove the key from the key slot identified by `Slot`. The password is necessary to -- make sure a valid password is available. The `Remove_Current` must be set to remove -- the slot when it corresponds to the used password. procedure Remove_Key (Manager : in out Key_Manager; Password : in out Keystore.Passwords.Provider'Class; Slot : in Key_Slot; Remove_Current : in Boolean; Ident : in Wallet_Identifier; Block : in Keystore.IO.Storage_Block; Stream : in out IO.Wallet_Stream'Class); -- Create a new masker keys for a children wallet and save the new keys in the buffer. procedure Create_Master_Key (Manager : in out Key_Manager; Buffer : in out Marshallers.Marshaller; Crypt : in Cryptor); -- Extract from the buffer the master keys to open the children wallet. procedure Load_Master_Key (Manager : in out Key_Manager; Buffer : in out Marshallers.Marshaller; Crypt : in Cryptor); -- Set the master key by using the password provider. procedure Set_Master_Key (Manager : in out Key_Manager; Password : in out Keystore.Passwords.Keys.Key_Provider'Class); private -- Size of a key slot. WH_SLOT_SIZE : constant := 512; -- Wallet header magic. WH_MAGIC : constant := 16#Ada00Ada#; WH_KEY_SIZE : constant := Util.Encoders.AES.AES_256_Length; WH_HEADER_START : constant IO.Block_Index := IO.BT_DATA_START; WH_HEADER_LENGTH : constant := 16 + 16 + 8; WH_KEY_LIST_START : constant IO.Block_Index := WH_HEADER_START + WH_HEADER_LENGTH + 1; -- Key slot type is using PBKDF2-HMAC-256. WH_KEY_PBKDF2 : constant := 16#0001#; -- Key slot type is using PBKDF2-HMAC-256 with a GPG2 key. WH_KEY_GPG2 : constant := 16#0002#; type Key_Manager is limited record Id : Wallet_Identifier; Parent_Id : Wallet_Identifier; Header_Block : Keystore.IO.Storage_Block; Random : Keystore.Random.Generator; Crypt : Cryptor; end record; function Key_Position (Slot : in Key_Slot) return IO.Block_Index is (WH_KEY_LIST_START + IO.Block_Index (Slot) * WH_SLOT_SIZE - WH_SLOT_SIZE - 1); end Keystore.Keys;
meowthsli/veriflight_boards
Ada
554
ads
with STM32.GPIO; use STM32.GPIO; with mpu6000_spi; use mpu6000_spi; with Config; use Config; with Interfaces; use Interfaces; -- -- Accel is MPU 6000 -- package spi_accel is procedure init; type accel_data is record X, Y, Z : Short_Integer; GX, GY, GZ : Short_Integer; end record; function read return accel_data; function id (product : out Unsigned_8) return Unsigned_8; private gyro : Six_Axis_Accelerometer (Port => SPI_Accel_Port'Access, Chip_Select => CS_ACCEL'Access); end spi_accel;
reznikmm/matreshka
Ada
4,391
adb
------------------------------------------------------------------------------ -- -- -- Matreshka Project -- -- -- -- Localization, Internationalization, Globalization for Ada -- -- -- -- Runtime Library Component -- -- -- ------------------------------------------------------------------------------ -- -- -- Copyright © 2010-2011, Vadim Godunko <[email protected]> -- -- All rights reserved. -- -- -- -- Redistribution and use in source and binary forms, with or without -- -- modification, are permitted provided that the following conditions -- -- are met: -- -- -- -- * Redistributions of source code must retain the above copyright -- -- notice, this list of conditions and the following disclaimer. -- -- -- -- * Redistributions in binary form must reproduce the above copyright -- -- notice, this list of conditions and the following disclaimer in the -- -- documentation and/or other materials provided with the distribution. -- -- -- -- * Neither the name of the Vadim Godunko, IE nor the names of its -- -- contributors may be used to endorse or promote products derived from -- -- this software without specific prior written permission. -- -- -- -- THIS SOFTWARE IS PROVIDED BY THE COPYRIGHT HOLDERS AND CONTRIBUTORS -- -- "AS IS" AND ANY EXPRESS OR IMPLIED WARRANTIES, INCLUDING, BUT NOT -- -- LIMITED TO, THE IMPLIED WARRANTIES OF MERCHANTABILITY AND FITNESS FOR -- -- A PARTICULAR PURPOSE ARE DISCLAIMED. IN NO EVENT SHALL THE COPYRIGHT -- -- HOLDER OR CONTRIBUTORS BE LIABLE FOR ANY DIRECT, INDIRECT, INCIDENTAL, -- -- SPECIAL, EXEMPLARY, OR CONSEQUENTIAL DAMAGES (INCLUDING, BUT NOT LIMITED -- -- TO, PROCUREMENT OF SUBSTITUTE GOODS OR SERVICES; LOSS OF USE, DATA, OR -- -- PROFITS; OR BUSINESS INTERRUPTION) HOWEVER CAUSED AND ON ANY THEORY OF -- -- LIABILITY, WHETHER IN CONTRACT, STRICT LIABILITY, OR TORT (INCLUDING -- -- NEGLIGENCE OR OTHERWISE) ARISING IN ANY WAY OUT OF THE USE OF THIS -- -- SOFTWARE, EVEN IF ADVISED OF THE POSSIBILITY OF SUCH DAMAGE. -- -- -- ------------------------------------------------------------------------------ -- $Revision$ $Date$ ------------------------------------------------------------------------------ package body Matreshka.Internals.Translator is --------------- -- Translate -- --------------- function Translate (Context : League.Strings.Universal_String; Source_Text : League.Strings.Universal_String; Disambiguation : League.Strings.Universal_String) return League.Strings.Universal_String is pragma Unreferenced (Disambiguation); use Context_Maps; use Universal_String_Maps; Context_Position : constant Context_Maps.Cursor := Translations.Find (Context); Translation_Position : Universal_String_Maps.Cursor; begin if not Has_Element (Context_Position) then -- There is no context. return Source_Text; end if; Translation_Position := Element (Context_Position).Translations.Find (Source_Text); if Has_Element (Translation_Position) then return Element (Translation_Position); else return Source_Text; end if; end Translate; end Matreshka.Internals.Translator;
seeduvax/AcrobatomaticBuildSystem
Ada
79
ads
Package Example is function Hello(i: in Integer) return Integer; end Example;
reznikmm/matreshka
Ada
3,606
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.Final_Nodes.Hash is new AMF.Elements.Generic_Hash (UML_Final_Node, UML_Final_Node_Access);
reznikmm/matreshka
Ada
3,689
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.Text_Page_Sequence_Elements is pragma Preelaborate; type ODF_Text_Page_Sequence is limited interface and XML.DOM.Elements.DOM_Element; type ODF_Text_Page_Sequence_Access is access all ODF_Text_Page_Sequence'Class with Storage_Size => 0; end ODF.DOM.Text_Page_Sequence_Elements;
Fabien-Chouteau/cortex-m
Ada
9,730
adb
------------------------------------------------------------------------------ -- -- -- Copyright (C) 2015-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 STMicroelectronics nor the names of its -- -- contributors may be used to endorse or promote products derived -- -- from this software without specific prior written permission. -- -- -- -- THIS SOFTWARE IS PROVIDED BY THE COPYRIGHT HOLDERS AND CONTRIBUTORS -- -- "AS IS" AND ANY EXPRESS OR IMPLIED WARRANTIES, INCLUDING, BUT NOT -- -- LIMITED TO, THE IMPLIED WARRANTIES OF MERCHANTABILITY AND FITNESS FOR -- -- A PARTICULAR PURPOSE ARE DISCLAIMED. IN NO EVENT SHALL THE COPYRIGHT -- -- HOLDER OR CONTRIBUTORS BE LIABLE FOR ANY DIRECT, INDIRECT, INCIDENTAL, -- -- SPECIAL, EXEMPLARY, OR CONSEQUENTIAL DAMAGES (INCLUDING, BUT NOT -- -- LIMITED TO, PROCUREMENT OF SUBSTITUTE GOODS OR SERVICES; LOSS OF USE, -- -- DATA, OR PROFITS; OR BUSINESS INTERRUPTION) HOWEVER CAUSED AND ON ANY -- -- THEORY OF LIABILITY, WHETHER IN CONTRACT, STRICT LIABILITY, OR TORT -- -- (INCLUDING NEGLIGENCE OR OTHERWISE) ARISING IN ANY WAY OUT OF THE USE -- -- OF THIS SOFTWARE, EVEN IF ADVISED OF THE POSSIBILITY OF SUCH DAMAGE. -- -- -- -- -- -- This file is based on: -- -- -- -- @file stm32f4xx_hal_cortex.c -- -- @author MCD Application Team -- -- @version V1.1.0 -- -- @date 19-June-2014 -- -- @brief CORTEX HAL module driver. -- -- -- -- COPYRIGHT(c) 2014 STMicroelectronics -- ------------------------------------------------------------------------------ with Memory_Barriers; package body Cortex_M.NVIC is ----------------------- -- Priority_Grouping -- ----------------------- function Priority_Grouping return Interrupt_Priority is begin return Interrupt_Priority (Shift_Right (SCB.AIRCR and SCB_AIRCR_PRIGROUP_Mask, SCB_AIRCR_PRIGROUP_Pos)); end Priority_Grouping; --------------------------- -- Set_Priority_Grouping -- --------------------------- procedure Set_Priority_Grouping (Priority_Group : Interrupt_Priority) is Reg_Value : UInt32; PriorityGroupTmp : constant UInt32 := UInt32 (Priority_Group) and 16#07#; Key : constant := 16#5FA#; begin Reg_Value := SCB.AIRCR; Reg_Value := Reg_Value and (not (SCB_AIRCR_VECTKEY_Mask or SCB_AIRCR_PRIGROUP_Mask)); Reg_Value := Reg_Value or Shift_Left (Key, SCB_AIRCR_VECTKEY_Pos) or Shift_Left (PriorityGroupTmp, 8); SCB.AIRCR := Reg_Value; end Set_Priority_Grouping; ------------------ -- Set_Priority -- ------------------ procedure Set_Priority (IRQn : Interrupt_ID; Priority : Interrupt_Priority) is Index : constant Natural := Integer (IRQn); Value : constant UInt32 := Shift_Left (UInt32 (Priority), 8 - NVIC_PRIO_BITS) and 16#FF#; begin -- IRQ numbers are never less than 0 in the current definition, hence -- the code is different from that in the CMSIS. NVIC.IP (Index) := UInt8 (Value); end Set_Priority; ---------------------- -- Encoded_Priority -- ---------------------- function Encoded_Priority (Priority_Group : Interrupt_Priority; Preempt_Priority : Interrupt_Priority; Subpriority : Interrupt_Priority) return Interrupt_Priority is PriorityGroupTmp : constant Interrupt_Priority := Priority_Group and 16#07#; PreemptPriorityBits : Interrupt_Priority; SubPriorityBits : Interrupt_Priority; Temp1 : Interrupt_Priority; Temp2 : Interrupt_Priority; Temp3 : Interrupt_Priority; Temp4 : Interrupt_Priority; Temp5 : Interrupt_Priority; begin if (7 - PriorityGroupTmp) > NVIC_PRIO_BITS then PreemptPriorityBits := NVIC_PRIO_BITS; else PreemptPriorityBits := 7 - PriorityGroupTmp; end if; if (PriorityGroupTmp + NVIC_PRIO_BITS) < 7 then SubPriorityBits := 0; else SubPriorityBits := PriorityGroupTmp - 7 + NVIC_PRIO_BITS; end if; Temp1 := Shift_Left (1, Integer (PreemptPriorityBits)) - 1; Temp2 := Preempt_Priority and Temp1; Temp3 := Shift_Left (Temp2, Integer (SubPriorityBits)); Temp4 := Shift_Left (1, Integer (SubPriorityBits)) - 1; Temp5 := Subpriority and Temp4; return Temp3 or Temp5; end Encoded_Priority; ------------------ -- Set_Priority -- ------------------ procedure Set_Priority (IRQn : Interrupt_ID; Preempt_Priority : Interrupt_Priority; Subpriority : Interrupt_Priority) is Priority_Group : constant Interrupt_Priority := Priority_Grouping; begin Set_Priority (IRQn, Encoded_Priority (Priority_Group, Preempt_Priority, Subpriority)); end Set_Priority; ---------------------- -- Enable_Interrupt -- ---------------------- procedure Enable_Interrupt (IRQn : Interrupt_ID) is IRQn_As_Word : constant UInt32 := UInt32 (IRQn); Index : constant Natural := Integer (Shift_Right (IRQn_As_Word, 5)); begin NVIC.ISER (Index) := Shift_Left (1, Integer (IRQn_As_Word and 16#1F#)); end Enable_Interrupt; ----------------------- -- Disable_Interrupt -- ----------------------- procedure Disable_Interrupt (IRQn : Interrupt_ID) is IRQn_As_Word : constant UInt32 := UInt32 (IRQn); Index : constant Natural := Integer (Shift_Right (IRQn_As_Word, 5)); begin -- NVIC->ICER[((uint32_t)(IRQn)>>5)] = (1 << ((uint32_t)(IRQn) & 0x1F)); NVIC.ICER (Index) := Shift_Left (1, Integer (IRQn_As_Word and 16#1F#)); end Disable_Interrupt; ------------ -- Active -- ------------ function Active (IRQn : Interrupt_ID) return Boolean is IRQn_As_Word : constant UInt32 := UInt32 (IRQn); Index : constant Natural := Integer (Shift_Right (IRQn_As_Word, 5)); Value : constant UInt32 := Shift_Left (1, Integer (IRQn_As_Word and 16#1F#)); begin return (NVIC.IABR (Index) and Value) /= 0; end Active; ------------- -- Pending -- ------------- function Pending (IRQn : Interrupt_ID) return Boolean is IRQn_As_Word : constant UInt32 := UInt32 (IRQn); Index : constant Natural := Integer (Shift_Right (IRQn_As_Word, 5)); Value : constant UInt32 := Shift_Left (1, Integer (IRQn_As_Word and 16#1F#)); begin return (NVIC.ISPR (Index) and Value) /= 0; end Pending; ----------------- -- Set_Pending -- ----------------- procedure Set_Pending (IRQn : Interrupt_ID) is IRQn_As_Word : constant UInt32 := UInt32 (IRQn); Index : constant Natural := Integer (Shift_Right (IRQn_As_Word, 5)); begin NVIC.ISPR (Index) := Shift_Left (1, Integer (IRQn_As_Word and 16#1F#)); end Set_Pending; ------------------- -- Clear_Pending -- ------------------- procedure Clear_Pending (IRQn : Interrupt_ID) is IRQn_As_Word : constant UInt32 := UInt32 (IRQn); Index : constant Natural := Integer (Shift_Right (IRQn_As_Word, 5)); begin NVIC.ICPR (Index) := Shift_Left (1, Integer (IRQn_As_Word and 16#1F#)); end Clear_Pending; ------------------ -- Reset_System -- ------------------ procedure Reset_System is Key : constant := 16#05FA#; -- required for write to be accepted use Memory_Barriers; begin -- Ensure all outstanding memory accesses including -- buffered writes are completed Data_Synchronization_Barrier; SCB.AIRCR := Shift_Left (Key, SCB_AIRCR_VECTKEY_Pos) or -- keep priority group unchanged (SCB.AIRCR and SCB_AIRCR_PRIGROUP_Mask) or SCB_AIRCR_SYSRESETREQ_Mask; -- TODO: why is all code from here onward in the CMSIS??? Data_Synchronization_Barrier; -- wait until reset pragma Warnings (Off); <<spin>> goto spin; pragma Warnings (On); end Reset_System; end Cortex_M.NVIC;
clairvoyant/anagram
Ada
1,651
ads
-- Copyright (c) 2010-2017 Maxim Reznik <[email protected]> -- -- SPDX-License-Identifier: MIT -- License-Filename: LICENSE ------------------------------------------------------------- package Anagram.Grammars.LR_Parsers is pragma Preelaborate; type State_Index is mod 2 ** 16; for State_Index'Size use 16; type Action_Kinds is (Shift, Reduce, Error, Finish); type Action (Kind : Action_Kinds := Error) is record case Kind is when Shift => State : State_Index; when Reduce => Prod : Production_Index; NT : Non_Terminal_Index; Parts : Natural; when Error | Finish => null; end case; end record; generic type Node is private; -- AST node type Node_Array is array (Positive range <>) of Node; -- List of AST nodes type Lexer (<>) is limited private; type Parser (<>) is limited private; with procedure Next_Token (Self : access Lexer; Token : out Terminal_Count; Value : out Node); with procedure Next_Action (State : State_Index; Token : Terminal_Count; Value : out Action); with function Go_To (State : State_Index; NT : Non_Terminal_Index) return State_Index; with procedure On_Reduce (Self : access Parser; Prod : Anagram.Grammars.Production_Index; Nodes : in out Node_Array); procedure Parse (Self : access Parser; Input : access Lexer; Root : out Node; Success : out Boolean); end Anagram.Grammars.LR_Parsers;
wookey-project/ewok-legacy
Ada
40
ads
../../stm32f439/Ada/default_handlers.ads
peterfrankjohnson/kernel
Ada
673
adb
package body CPU.ProtectedMode is procedure CreateTSS is begin -- TSS.cs := 16#0B#; -- TSS.ss0 := 16#10#; -- TSS.esp0 := 16#2ffff#; -- TSS.ds := 16#13#; -- TSS.es := 16#13#; -- TSS.fs := 16#13#; -- TSS.gs := 16#13#; TSS.cs := 16#1B#; TSS.ss0 := 16#10#; TSS.esp0 := 16#2ffff#; TSS.ss := 16#20#; TSS.esp := 16#2efff#; TSS.ds := 16#23#; TSS.es := 16#23#; TSS.fs := 16#23#; TSS.gs := 16#23#; null; end CreateTSS; procedure Enable is CR0 : Double; begin CR0 := ReadCR0; CR0 := CR0 or 2; WriteCR0 (CR0); end Enable; end CPU.ProtectedMode;
stcarrez/ada-asf
Ada
919
ads
----------------------------------------------------------------------- -- asf-clients -- HTTP Clients -- Copyright (C) 2011, 2012 Stephane Carrez -- Written by Stephane Carrez ([email protected]) -- -- Licensed under the Apache License, Version 2.0 (the "License"); -- you may not use this file except in compliance with the License. -- You may obtain a copy of the License at -- -- http://www.apache.org/licenses/LICENSE-2.0 -- -- Unless required by applicable law or agreed to in writing, software -- distributed under the License is distributed on an "AS IS" BASIS, -- WITHOUT WARRANTIES OR CONDITIONS OF ANY KIND, either express or implied. -- See the License for the specific language governing permissions and -- limitations under the License. ----------------------------------------------------------------------- with Util.Http.Clients; package ASF.Clients renames Util.Http.Clients;
AdaCore/langkit
Ada
1,252
ads
-- -- Copyright (C) 2014-2022, AdaCore -- SPDX-License-Identifier: Apache-2.0 -- with Langkit_Support.Generic_API; use Langkit_Support.Generic_API; with Langkit_Support.Text; use Langkit_Support.Text; -- This package and its children provide common implementation details for -- Langkit-generated libraries. Even though it is not private (to allow -- Langkit-generated libraries to use it), it is not meant to be used beyond -- this. As such, this API is considered unsafe and unstable. package Langkit_Support.Internal is type Text_Access is not null access constant Text_Type; type Text_Access_Or_Null is access constant Text_Type; -- Reference to a static Unicode string. Used in descriptor tables whenever -- we need to provide a name. type Debug_String_Access is not null access constant String; -- Reference to a statically allocated String. Used in descriptor tables -- whenever we need to provide string for debug (compatible with -- Ada.Text_IO). -- Descriptors for token types type Token_Kind_Name_Array is array (Token_Kind_Index range <>) of Text_Access; type Token_Kind_Name_Array_Access is not null access constant Token_Kind_Name_Array; end Langkit_Support.Internal;
zertovitch/zip-ada
Ada
6,513
adb
------------------------------------------------------------------------------ -- File: Comp_Zip_Prc.adb -- Description: A Zip comparison tool using Zip-Ada lib. -- Demonstrates the Zip.Traverse procedure. -- See Comp_Zip for a command-line tool using it. -- Author: Gautier de Montmollin ------------------------------------------------------------------------------ with Ada.Characters.Handling, Ada.Integer_Text_IO, Ada.Text_IO; with Interfaces; with Zip; with UnZip.Streams; procedure Comp_Zip_Prc ( z1, z2 : Zip.Zip_info; quiet : Natural; password : String := ""; total_differences : out Natural ) is use Interfaces; z : array (1 .. 2) of Zip.Zip_info; total_1, total_2, common, size_failures, compare_failures, missing_1_in_2, just_a_directory, missing_2_in_1 : Natural := 0; total_bytes : Integer_64 := 0; first_item : Boolean := True; use Ada.Text_IO; procedure Compare_1_file (file_name : String) is use UnZip.Streams; f : array (1 .. 2) of Zipped_File_Type; s : array (1 .. 2) of Stream_Access; c : array (1 .. 2) of Character; p : Integer_64 := 1; function Cut_name (n : String; l : Natural) return String is dots : constant String := "..."; begin if n'Length > l then return dots & n (n'Last - (l - 1) + dots'Length .. n'Last); else return n; end if; end Cut_name; l : constant := 40; mininame : constant String := Ada.Characters.Handling.To_Lower (Cut_name (file_name, l)); stuffing : constant String (1 .. l - mininame'Length + 1) := (others => ' '); begin if quiet = 0 then if first_item then New_Line; first_item := False; end if; Put (" [" & stuffing & mininame & "] "); end if; for i in 1 .. 2 loop begin Open (f (i), z (i), file_name, password); if i = 1 then total_1 := total_1 + 1; end if; exception when Zip.Entry_name_not_found => if quiet = 0 then Put (" # Not found in archive [" & Zip.Zip_name (z (i)) & ']'); end if; if i = 1 then Put_Line ("-- internal error!"); else Close (f (1)); end if; if file_name (file_name'Last) = '/' or file_name (file_name'Last) = '\' then just_a_directory := just_a_directory + 1; if quiet = 0 then Put_Line (" (just a dir.)"); end if; else if quiet = 0 then New_Line; end if; end if; missing_1_in_2 := missing_1_in_2 + 1; return; end; s (i) := Stream (f (i)); end loop; -- File found, now the comparison: while not End_Of_File (f (1)) loop if End_Of_File (f (2)) then if quiet = 0 then Put_Line (" # Shorter in [" & Zip.Zip_name (z (2)) & "] at position" & Integer_64'Image (p)); end if; Close (f (1)); Close (f (2)); size_failures := size_failures + 1; return; end if; -- Read one character in each stream for i in 1 .. 2 loop Character'Read (s (i), c (i)); end loop; if c (1) /= c (2) then if quiet = 0 then Put_Line (" # Difference at position" & Integer_64'Image (p)); end if; Close (f (1)); Close (f (2)); compare_failures := compare_failures + 1; return; end if; p := p + 1; end loop; if not End_Of_File (f (2)) then if quiet = 0 then Put_Line (" # Longer in [" & Zip.Zip_name (z (2)) & "]"); end if; Close (f (1)); Close (f (2)); size_failures := size_failures + 1; return; end if; Close (f (1)); Close (f (2)); if quiet = 0 then Put_Line ("OK -" & Integer_64'Image (p - 1) & " bytes compared"); end if; total_bytes := total_bytes + (p - 1); end Compare_1_file; procedure Compare_all_files is new Zip.Traverse (Compare_1_file); err_str : String (1 .. 5); use Ada.Integer_Text_IO; begin z (1) := z1; z (2) := z2; if quiet <= 3 then Put ("* Comparing [" & Zip.Zip_name (z (1)) & "] and [" & Zip.Zip_name (z (2)) & ']'); end if; Compare_all_files (z (1)); total_2 := Zip.Entries (z (2)); common := total_1 - missing_1_in_2; if quiet < 2 then Put_Line ("* === Results ==="); Put_Line (" 1st archive: [" & Zip.Zip_name (z (1)) & "], total files:" & Natural'Image (total_1)); Put_Line (" 2nd archive: [" & Zip.Zip_name (z (2)) & "], total files:" & Natural'Image (total_2)); Put_Line (" Total files compared: " & Natural'Image (common)); Put_Line (" Total of correct bytes: " & Integer_64'Image (total_bytes)); end if; missing_2_in_1 := total_2 - common; -- t2 - m21 = t1 - m12 = # common files total_differences := size_failures + compare_failures + missing_1_in_2 + missing_2_in_1; case quiet is when 0 .. 2 => New_Line; Put_Line ("* === Comparison summary ==="); Put (err_str, size_failures); Put_Line (" Size failures . . . . . . . . . . . :" & err_str); Put (err_str, compare_failures); Put_Line (" Content comparison failures . . . . :" & err_str); Put (err_str, missing_1_in_2); Put (" Files of 1st archive missing in 2nd :" & err_str); -- if just_a_directory > 0 then Put_Line (" (" & Integer'Image (just_a_directory) & " useless dir. names)"); else New_Line; end if; -- Put (err_str, missing_2_in_1); for i in err_str'Range loop if err_str (i) = ' ' then err_str (i) := '_'; end if; end loop; Put_Line (" __Files of 2nd archive missing in 1st :" & err_str & "__"); -- Put (err_str, total_differences); Put_Line (" Total of errors . . . . . . . . . . . :" & err_str); when 3 => if total_differences = 0 then Put_Line (" OK"); else Put (err_str, total_differences); Put_Line (" Differences:" & err_str); end if; when others => null; end case; end Comp_Zip_Prc;
alexcamposruiz/dds-requestreply
Ada
5,375
ads
with DDS.Publisher; with DDS.Subscriber; with DDS.Request_Reply.Connext_C_Replier; with DDS.Request_Reply.Connext_C_Entity_Params; with DDS.Typed_DataWriter_Generic; with DDS.Typed_DataReader_Generic; generic with package Reply_DataWriter is new DDS.Typed_DataWriter_Generic (<>); with package Request_DataReader is new DDS.Typed_DataReader_Generic (<>); package Dds.Request_Reply.Connext_C_Replier.Simple_Replier_Generic is use Connext_C_Entity_Params; type Ref (<>) is new Dds.Request_Reply.Connext_C_Replier.RTI_Connext_Replier with private; type Ref_Access is access all Ref'Class; function Create_With_Profile (Participant : DDS.DomainParticipant.Ref_Access; Service_Name : DDS.String; Qos_Library_Name : DDS.String; Qos_Profile_Name : DDS.String; Listner : RTI_Connext_SimpleReplierListener_Access := null) return Ref_Access; function Create_With_Profile (Participant : DDS.DomainParticipant.Ref_Access; Request_Topic_Name : DDS.String; Reply_Topic_Name : DDS.String; Qos_Library_Name : DDS.String; Qos_Profile_Name : DDS.String; Listner : RTI_Connext_SimpleReplierListener_Access := null) return Ref_Access; function Create_With_Profile (Publisher : not null DDS.Publisher.Ref_Access; Subscriber : not null DDS.Subscriber.Ref_Access; Service_Name : DDS.String; Qos_Library_Name : DDS.String; Qos_Profile_Name : DDS.String; Listner : RTI_Connext_SimpleReplierListener_Access := null) return Ref_Access; function Create_With_Profile (Publisher : not null DDS.Publisher.Ref_Access; Subscriber : not null DDS.Subscriber.Ref_Access; Request_Topic_Name : DDS.String; Reply_Topic_Name : DDS.String; Qos_Library_Name : DDS.String; Qos_Profile_Name : DDS.String; Listner : RTI_Connext_SimpleReplierListener_Access := null) return Ref_Access; ------ function Create (Participant : DDS.DomainParticipant.Ref_Access; Service_Name : DDS.String; DataReader_QoS : DDS.DataReaderQoS := DDS.Subscriber.DATAREADER_QOS_DEFAULT; DataWriter_QoS : DDS.DataWriterQoS := DDS.Publisher.DATAWRITER_QOS_DEFAULT; Listner : RTI_Connext_SimpleReplierListener_Access := null) return Ref_Access; function Create (Participant : DDS.DomainParticipant.Ref_Access; Request_Topic_Name : DDS.String; Reply_Topic_Name : DDS.String; DataReader_QoS : DDS.DataReaderQoS := DDS.Subscriber.DATAREADER_QOS_DEFAULT; DataWriter_QoS : DDS.DataWriterQoS := DDS.Publisher.DATAWRITER_QOS_DEFAULT; Listner : RTI_Connext_SimpleReplierListener_Access := null) return Ref_Access; function Create (Publisher : not null DDS.Publisher.Ref_Access; Subscriber : not null DDS.Subscriber.Ref_Access; Service_Name : DDS.String; DataReader_QoS : DDS.DataReaderQoS := DDS.Subscriber.DATAREADER_QOS_DEFAULT; DataWriter_QoS : DDS.DataWriterQoS := DDS.Publisher.DATAWRITER_QOS_DEFAULT; Listner : RTI_Connext_SimpleReplierListener_Access := null) return Ref_Access; function Create (Publisher : not null DDS.Publisher.Ref_Access; Subscriber : not null DDS.Subscriber.Ref_Access; Request_Topic_Name : DDS.String; Reply_Topic_Name : DDS.String; DataReader_QoS : DDS.DataReaderQoS := DDS.Subscriber.DATAREADER_QOS_DEFAULT; DataWriter_QoS : DDS.DataWriterQoS := DDS.Publisher.DATAWRITER_QOS_DEFAULT; Listner : RTI_Connext_SimpleReplierListener_Access := null) return Ref_Access; type RTI_Connext_SimpleReplierParams is new RTI_Connext_EntityParams with record Simple_Listener : RTI_Connext_SimpleReplierListener; end record; function Create (Params : RTI_Connext_SimpleReplierParams) return Ref_Access; procedure Delete (Self : in out Ref_Access); function Get_Request_Datareader (Self : not null access Ref) return Request_DataReader.Ref_Access; function Get_Reply_Datawriter (Self : not null access Ref) return Reply_DataWriter.Ref_Access; private type Ref (Simple_Listener : RTI_Connext_SimpleReplierListener_Access) is new Dds.Request_Reply.Connext_C_Replier.RTI_Connext_Replier with record null; end record; end Dds.Request_Reply.Connext_C_Replier.Simple_Replier_Generic;
JeremyGrosser/Ada_Drivers_Library
Ada
1,938
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 := "STM32F429_Discovery"; -- 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 := "STM32F429ZITx"; -- 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-stm32f429disco"; -- From default value Runtime_Name_Suffix : constant String := "stm32f429disco"; -- 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;
reznikmm/matreshka
Ada
3,759
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_Caption_Line_Length_Attributes is pragma Preelaborate; type ODF_Draw_Caption_Line_Length_Attribute is limited interface and XML.DOM.Attributes.DOM_Attribute; type ODF_Draw_Caption_Line_Length_Attribute_Access is access all ODF_Draw_Caption_Line_Length_Attribute'Class with Storage_Size => 0; end ODF.DOM.Draw_Caption_Line_Length_Attributes;
charlie5/cBound
Ada
2,348
ads
-- This file is generated by SWIG. Please do *not* modify by hand. -- with interfaces.C; package fann_c.Pointers is -- FILE_Pointer -- type FILE_Pointer is access all fann_c.FILE; -- FILE_Pointers -- type FILE_Pointers is array (interfaces.C.Size_t range <>) of aliased fann_c.Pointers.FILE_Pointer; -- fann_type_Pointer -- type fann_type_Pointer is access all fann_c.fann_type; -- fann_type_Pointers -- type fann_type_Pointers is array (interfaces.C.Size_t range <>) of aliased fann_c.Pointers.fann_type_Pointer; -- fann_errno_enum_Pointer -- type fann_errno_enum_Pointer is access all fann_c.fann_errno_enum; -- fann_errno_enum_Pointers -- type fann_errno_enum_Pointers is array (interfaces.C.Size_t range <>) of aliased fann_c.Pointers.fann_errno_enum_Pointer; -- fann_train_enum_Pointer -- type fann_train_enum_Pointer is access all fann_c.fann_train_enum; -- fann_train_enum_Pointers -- type fann_train_enum_Pointers is array (interfaces.C.Size_t range <>) of aliased fann_c.Pointers.fann_train_enum_Pointer; -- fann_activationfunc_enum_Pointer -- type fann_activationfunc_enum_Pointer is access all fann_c.fann_activationfunc_enum; -- fann_activationfunc_enum_Pointers -- type fann_activationfunc_enum_Pointers is array (interfaces.C.Size_t range <>) of aliased fann_c.Pointers.fann_activationfunc_enum_Pointer; -- fann_errorfunc_enum_Pointer -- type fann_errorfunc_enum_Pointer is access all fann_c.fann_errorfunc_enum; -- fann_errorfunc_enum_Pointers -- type fann_errorfunc_enum_Pointers is array (interfaces.C.Size_t range <>) of aliased fann_c.Pointers.fann_errorfunc_enum_Pointer; -- fann_stopfunc_enum_Pointer -- type fann_stopfunc_enum_Pointer is access all fann_c.fann_stopfunc_enum; -- fann_stopfunc_enum_Pointers -- type fann_stopfunc_enum_Pointers is array (interfaces.C.Size_t range <>) of aliased fann_c.Pointers.fann_stopfunc_enum_Pointer; -- fann_nettype_enum_Pointer -- type fann_nettype_enum_Pointer is access all fann_c.fann_nettype_enum; -- fann_nettype_enum_Pointers -- type fann_nettype_enum_Pointers is array (interfaces.C.Size_t range <>) of aliased fann_c.Pointers.fann_nettype_enum_Pointer; end fann_c.Pointers;
reznikmm/matreshka
Ada
65,497
ads
------------------------------------------------------------------------------ -- -- -- Matreshka Project -- -- -- -- Ada Modeling Framework -- -- -- -- Runtime Library Component -- -- -- ------------------------------------------------------------------------------ -- -- -- Copyright © 2012, Vadim Godunko <[email protected]> -- -- All rights reserved. -- -- -- -- Redistribution and use in source and binary forms, with or without -- -- modification, are permitted provided that the following conditions -- -- are met: -- -- -- -- * Redistributions of source code must retain the above copyright -- -- notice, this list of conditions and the following disclaimer. -- -- -- -- * Redistributions in binary form must reproduce the above copyright -- -- notice, this list of conditions and the following disclaimer in the -- -- documentation and/or other materials provided with the distribution. -- -- -- -- * Neither the name of the Vadim Godunko, IE nor the names of its -- -- contributors may be used to endorse or promote products derived from -- -- this software without specific prior written permission. -- -- -- -- THIS SOFTWARE IS PROVIDED BY THE COPYRIGHT HOLDERS AND CONTRIBUTORS -- -- "AS IS" AND ANY EXPRESS OR IMPLIED WARRANTIES, INCLUDING, BUT NOT -- -- LIMITED TO, THE IMPLIED WARRANTIES OF MERCHANTABILITY AND FITNESS FOR -- -- A PARTICULAR PURPOSE ARE DISCLAIMED. IN NO EVENT SHALL THE COPYRIGHT -- -- HOLDER OR CONTRIBUTORS BE LIABLE FOR ANY DIRECT, INDIRECT, INCIDENTAL, -- -- SPECIAL, EXEMPLARY, OR CONSEQUENTIAL DAMAGES (INCLUDING, BUT NOT LIMITED -- -- TO, PROCUREMENT OF SUBSTITUTE GOODS OR SERVICES; LOSS OF USE, DATA, OR -- -- PROFITS; OR BUSINESS INTERRUPTION) HOWEVER CAUSED AND ON ANY THEORY OF -- -- LIABILITY, WHETHER IN CONTRACT, STRICT LIABILITY, OR TORT (INCLUDING -- -- NEGLIGENCE OR OTHERWISE) ARISING IN ANY WAY OUT OF THE USE OF THIS -- -- SOFTWARE, EVEN IF ADVISED OF THE POSSIBILITY OF SUCH DAMAGE. -- -- -- ------------------------------------------------------------------------------ -- $Revision$ $Date$ ------------------------------------------------------------------------------ -- This file is generated, don't edit it. ------------------------------------------------------------------------------ with AMF.UML.Abstractions; with AMF.UML.Accept_Call_Actions; with AMF.UML.Accept_Event_Actions; with AMF.UML.Action_Execution_Specifications; with AMF.UML.Action_Input_Pins; with AMF.UML.Activities; with AMF.UML.Activity_Final_Nodes; with AMF.UML.Activity_Parameter_Nodes; with AMF.UML.Activity_Partitions; with AMF.UML.Actors; with AMF.UML.Add_Structural_Feature_Value_Actions; with AMF.UML.Add_Variable_Value_Actions; with AMF.UML.Any_Receive_Events; with AMF.UML.Artifacts; with AMF.UML.Association_Classes; with AMF.UML.Associations; with AMF.UML.Behavior_Execution_Specifications; with AMF.UML.Broadcast_Signal_Actions; with AMF.UML.Call_Behavior_Actions; with AMF.UML.Call_Events; with AMF.UML.Call_Operation_Actions; with AMF.UML.Central_Buffer_Nodes; with AMF.UML.Change_Events; with AMF.UML.Classes; with AMF.UML.Classifier_Template_Parameters; with AMF.UML.Clauses; with AMF.UML.Clear_Association_Actions; with AMF.UML.Clear_Structural_Feature_Actions; with AMF.UML.Clear_Variable_Actions; with AMF.UML.Collaboration_Uses; with AMF.UML.Collaborations; with AMF.UML.Combined_Fragments; with AMF.UML.Comments; with AMF.UML.Communication_Paths; with AMF.UML.Component_Realizations; with AMF.UML.Components; with AMF.UML.Conditional_Nodes; with AMF.UML.Connectable_Element_Template_Parameters; with AMF.UML.Connection_Point_References; with AMF.UML.Connector_Ends; with AMF.UML.Connectors; with AMF.UML.Consider_Ignore_Fragments; with AMF.UML.Constraints; with AMF.UML.Continuations; with AMF.UML.Control_Flows; with AMF.UML.Create_Link_Actions; with AMF.UML.Create_Link_Object_Actions; with AMF.UML.Create_Object_Actions; with AMF.UML.Data_Store_Nodes; with AMF.UML.Data_Types; with AMF.UML.Decision_Nodes; with AMF.UML.Dependencies; with AMF.UML.Deployment_Specifications; with AMF.UML.Deployments; with AMF.UML.Destroy_Link_Actions; with AMF.UML.Destroy_Object_Actions; with AMF.UML.Destruction_Occurrence_Specifications; with AMF.UML.Devices; with AMF.UML.Duration_Constraints; with AMF.UML.Duration_Intervals; with AMF.UML.Duration_Observations; with AMF.UML.Durations; with AMF.UML.Element_Imports; with AMF.UML.Enumeration_Literals; with AMF.UML.Enumerations; with AMF.UML.Exception_Handlers; with AMF.UML.Execution_Environments; with AMF.UML.Execution_Occurrence_Specifications; with AMF.UML.Expansion_Nodes; with AMF.UML.Expansion_Regions; with AMF.UML.Expressions; with AMF.UML.Extends; with AMF.UML.Extension_Ends; with AMF.UML.Extension_Points; with AMF.UML.Extensions; with AMF.UML.Final_States; with AMF.UML.Flow_Final_Nodes; with AMF.UML.Fork_Nodes; with AMF.UML.Function_Behaviors; with AMF.UML.Gates; with AMF.UML.General_Orderings; with AMF.UML.Generalization_Sets; with AMF.UML.Generalizations; with AMF.UML.Images; with AMF.UML.Includes; with AMF.UML.Information_Flows; with AMF.UML.Information_Items; with AMF.UML.Initial_Nodes; with AMF.UML.Input_Pins; with AMF.UML.Instance_Specifications; with AMF.UML.Instance_Values; with AMF.UML.Interaction_Constraints; with AMF.UML.Interaction_Operands; with AMF.UML.Interaction_Uses; with AMF.UML.Interactions; with AMF.UML.Interface_Realizations; with AMF.UML.Interfaces; with AMF.UML.Interruptible_Activity_Regions; with AMF.UML.Interval_Constraints; with AMF.UML.Intervals; with AMF.UML.Join_Nodes; with AMF.UML.Lifelines; with AMF.UML.Link_End_Creation_Datas; with AMF.UML.Link_End_Datas; with AMF.UML.Link_End_Destruction_Datas; with AMF.UML.Literal_Booleans; with AMF.UML.Literal_Integers; with AMF.UML.Literal_Nulls; with AMF.UML.Literal_Reals; with AMF.UML.Literal_Strings; with AMF.UML.Literal_Unlimited_Naturals; with AMF.UML.Loop_Nodes; with AMF.UML.Manifestations; with AMF.UML.Merge_Nodes; with AMF.UML.Message_Occurrence_Specifications; with AMF.UML.Messages; with AMF.UML.Models; with AMF.UML.Nodes; with AMF.UML.Object_Flows; with AMF.UML.Occurrence_Specifications; with AMF.UML.Opaque_Actions; with AMF.UML.Opaque_Behaviors; with AMF.UML.Opaque_Expressions; with AMF.UML.Operation_Template_Parameters; with AMF.UML.Operations; with AMF.UML.Output_Pins; with AMF.UML.Package_Imports; with AMF.UML.Package_Merges; with AMF.UML.Packages; with AMF.UML.Parameter_Sets; with AMF.UML.Parameters; with AMF.UML.Part_Decompositions; with AMF.UML.Ports; with AMF.UML.Primitive_Types; with AMF.UML.Profile_Applications; with AMF.UML.Profiles; with AMF.UML.Properties; with AMF.UML.Protocol_Conformances; with AMF.UML.Protocol_State_Machines; with AMF.UML.Protocol_Transitions; with AMF.UML.Pseudostates; with AMF.UML.Qualifier_Values; with AMF.UML.Raise_Exception_Actions; with AMF.UML.Read_Extent_Actions; with AMF.UML.Read_Is_Classified_Object_Actions; with AMF.UML.Read_Link_Actions; with AMF.UML.Read_Link_Object_End_Actions; with AMF.UML.Read_Link_Object_End_Qualifier_Actions; with AMF.UML.Read_Self_Actions; with AMF.UML.Read_Structural_Feature_Actions; with AMF.UML.Read_Variable_Actions; with AMF.UML.Realizations; with AMF.UML.Receptions; with AMF.UML.Reclassify_Object_Actions; with AMF.UML.Redefinable_Template_Signatures; with AMF.UML.Reduce_Actions; with AMF.UML.Regions; with AMF.UML.Remove_Structural_Feature_Value_Actions; with AMF.UML.Remove_Variable_Value_Actions; with AMF.UML.Reply_Actions; with AMF.UML.Send_Object_Actions; with AMF.UML.Send_Signal_Actions; with AMF.UML.Sequence_Nodes; with AMF.UML.Signal_Events; with AMF.UML.Signals; with AMF.UML.Slots; with AMF.UML.Start_Classifier_Behavior_Actions; with AMF.UML.Start_Object_Behavior_Actions; with AMF.UML.State_Invariants; with AMF.UML.State_Machines; with AMF.UML.States; with AMF.UML.Stereotypes; with AMF.UML.String_Expressions; with AMF.UML.Structured_Activity_Nodes; with AMF.UML.Substitutions; with AMF.UML.Template_Bindings; with AMF.UML.Template_Parameter_Substitutions; with AMF.UML.Template_Parameters; with AMF.UML.Template_Signatures; with AMF.UML.Test_Identity_Actions; with AMF.UML.Time_Constraints; with AMF.UML.Time_Events; with AMF.UML.Time_Expressions; with AMF.UML.Time_Intervals; with AMF.UML.Time_Observations; with AMF.UML.Transitions; with AMF.UML.Triggers; with AMF.UML.Unmarshall_Actions; with AMF.UML.Usages; with AMF.UML.Use_Cases; with AMF.UML.Value_Pins; with AMF.UML.Value_Specification_Actions; with AMF.UML.Variables; package AMF.Visitors.UML_Iterators is pragma Preelaborate; type UML_Iterator is limited interface and AMF.Visitors.Abstract_Iterator; not overriding procedure Visit_Abstraction (Self : in out UML_Iterator; Visitor : in out AMF.Visitors.Abstract_Visitor'Class; Element : not null AMF.UML.Abstractions.UML_Abstraction_Access; Control : in out AMF.Visitors.Traverse_Control) is null; not overriding procedure Visit_Accept_Call_Action (Self : in out UML_Iterator; Visitor : in out AMF.Visitors.Abstract_Visitor'Class; Element : not null AMF.UML.Accept_Call_Actions.UML_Accept_Call_Action_Access; Control : in out AMF.Visitors.Traverse_Control) is null; not overriding procedure Visit_Accept_Event_Action (Self : in out UML_Iterator; Visitor : in out AMF.Visitors.Abstract_Visitor'Class; Element : not null AMF.UML.Accept_Event_Actions.UML_Accept_Event_Action_Access; Control : in out AMF.Visitors.Traverse_Control) is null; not overriding procedure Visit_Action_Execution_Specification (Self : in out UML_Iterator; Visitor : in out AMF.Visitors.Abstract_Visitor'Class; Element : not null AMF.UML.Action_Execution_Specifications.UML_Action_Execution_Specification_Access; Control : in out AMF.Visitors.Traverse_Control) is null; not overriding procedure Visit_Action_Input_Pin (Self : in out UML_Iterator; Visitor : in out AMF.Visitors.Abstract_Visitor'Class; Element : not null AMF.UML.Action_Input_Pins.UML_Action_Input_Pin_Access; Control : in out AMF.Visitors.Traverse_Control) is null; not overriding procedure Visit_Activity (Self : in out UML_Iterator; Visitor : in out AMF.Visitors.Abstract_Visitor'Class; Element : not null AMF.UML.Activities.UML_Activity_Access; Control : in out AMF.Visitors.Traverse_Control) is null; not overriding procedure Visit_Activity_Final_Node (Self : in out UML_Iterator; Visitor : in out AMF.Visitors.Abstract_Visitor'Class; Element : not null AMF.UML.Activity_Final_Nodes.UML_Activity_Final_Node_Access; Control : in out AMF.Visitors.Traverse_Control) is null; not overriding procedure Visit_Activity_Parameter_Node (Self : in out UML_Iterator; Visitor : in out AMF.Visitors.Abstract_Visitor'Class; Element : not null AMF.UML.Activity_Parameter_Nodes.UML_Activity_Parameter_Node_Access; Control : in out AMF.Visitors.Traverse_Control) is null; not overriding procedure Visit_Activity_Partition (Self : in out UML_Iterator; Visitor : in out AMF.Visitors.Abstract_Visitor'Class; Element : not null AMF.UML.Activity_Partitions.UML_Activity_Partition_Access; Control : in out AMF.Visitors.Traverse_Control) is null; not overriding procedure Visit_Actor (Self : in out UML_Iterator; Visitor : in out AMF.Visitors.Abstract_Visitor'Class; Element : not null AMF.UML.Actors.UML_Actor_Access; Control : in out AMF.Visitors.Traverse_Control) is null; not overriding procedure Visit_Add_Structural_Feature_Value_Action (Self : in out UML_Iterator; Visitor : in out AMF.Visitors.Abstract_Visitor'Class; Element : not null AMF.UML.Add_Structural_Feature_Value_Actions.UML_Add_Structural_Feature_Value_Action_Access; Control : in out AMF.Visitors.Traverse_Control) is null; not overriding procedure Visit_Add_Variable_Value_Action (Self : in out UML_Iterator; Visitor : in out AMF.Visitors.Abstract_Visitor'Class; Element : not null AMF.UML.Add_Variable_Value_Actions.UML_Add_Variable_Value_Action_Access; Control : in out AMF.Visitors.Traverse_Control) is null; not overriding procedure Visit_Any_Receive_Event (Self : in out UML_Iterator; Visitor : in out AMF.Visitors.Abstract_Visitor'Class; Element : not null AMF.UML.Any_Receive_Events.UML_Any_Receive_Event_Access; Control : in out AMF.Visitors.Traverse_Control) is null; not overriding procedure Visit_Artifact (Self : in out UML_Iterator; Visitor : in out AMF.Visitors.Abstract_Visitor'Class; Element : not null AMF.UML.Artifacts.UML_Artifact_Access; Control : in out AMF.Visitors.Traverse_Control) is null; not overriding procedure Visit_Association (Self : in out UML_Iterator; Visitor : in out AMF.Visitors.Abstract_Visitor'Class; Element : not null AMF.UML.Associations.UML_Association_Access; Control : in out AMF.Visitors.Traverse_Control) is null; not overriding procedure Visit_Association_Class (Self : in out UML_Iterator; Visitor : in out AMF.Visitors.Abstract_Visitor'Class; Element : not null AMF.UML.Association_Classes.UML_Association_Class_Access; Control : in out AMF.Visitors.Traverse_Control) is null; not overriding procedure Visit_Behavior_Execution_Specification (Self : in out UML_Iterator; Visitor : in out AMF.Visitors.Abstract_Visitor'Class; Element : not null AMF.UML.Behavior_Execution_Specifications.UML_Behavior_Execution_Specification_Access; Control : in out AMF.Visitors.Traverse_Control) is null; not overriding procedure Visit_Broadcast_Signal_Action (Self : in out UML_Iterator; Visitor : in out AMF.Visitors.Abstract_Visitor'Class; Element : not null AMF.UML.Broadcast_Signal_Actions.UML_Broadcast_Signal_Action_Access; Control : in out AMF.Visitors.Traverse_Control) is null; not overriding procedure Visit_Call_Behavior_Action (Self : in out UML_Iterator; Visitor : in out AMF.Visitors.Abstract_Visitor'Class; Element : not null AMF.UML.Call_Behavior_Actions.UML_Call_Behavior_Action_Access; Control : in out AMF.Visitors.Traverse_Control) is null; not overriding procedure Visit_Call_Event (Self : in out UML_Iterator; Visitor : in out AMF.Visitors.Abstract_Visitor'Class; Element : not null AMF.UML.Call_Events.UML_Call_Event_Access; Control : in out AMF.Visitors.Traverse_Control) is null; not overriding procedure Visit_Call_Operation_Action (Self : in out UML_Iterator; Visitor : in out AMF.Visitors.Abstract_Visitor'Class; Element : not null AMF.UML.Call_Operation_Actions.UML_Call_Operation_Action_Access; Control : in out AMF.Visitors.Traverse_Control) is null; not overriding procedure Visit_Central_Buffer_Node (Self : in out UML_Iterator; Visitor : in out AMF.Visitors.Abstract_Visitor'Class; Element : not null AMF.UML.Central_Buffer_Nodes.UML_Central_Buffer_Node_Access; Control : in out AMF.Visitors.Traverse_Control) is null; not overriding procedure Visit_Change_Event (Self : in out UML_Iterator; Visitor : in out AMF.Visitors.Abstract_Visitor'Class; Element : not null AMF.UML.Change_Events.UML_Change_Event_Access; Control : in out AMF.Visitors.Traverse_Control) is null; not overriding procedure Visit_Class (Self : in out UML_Iterator; Visitor : in out AMF.Visitors.Abstract_Visitor'Class; Element : not null AMF.UML.Classes.UML_Class_Access; Control : in out AMF.Visitors.Traverse_Control) is null; not overriding procedure Visit_Classifier_Template_Parameter (Self : in out UML_Iterator; Visitor : in out AMF.Visitors.Abstract_Visitor'Class; Element : not null AMF.UML.Classifier_Template_Parameters.UML_Classifier_Template_Parameter_Access; Control : in out AMF.Visitors.Traverse_Control) is null; not overriding procedure Visit_Clause (Self : in out UML_Iterator; Visitor : in out AMF.Visitors.Abstract_Visitor'Class; Element : not null AMF.UML.Clauses.UML_Clause_Access; Control : in out AMF.Visitors.Traverse_Control) is null; not overriding procedure Visit_Clear_Association_Action (Self : in out UML_Iterator; Visitor : in out AMF.Visitors.Abstract_Visitor'Class; Element : not null AMF.UML.Clear_Association_Actions.UML_Clear_Association_Action_Access; Control : in out AMF.Visitors.Traverse_Control) is null; not overriding procedure Visit_Clear_Structural_Feature_Action (Self : in out UML_Iterator; Visitor : in out AMF.Visitors.Abstract_Visitor'Class; Element : not null AMF.UML.Clear_Structural_Feature_Actions.UML_Clear_Structural_Feature_Action_Access; Control : in out AMF.Visitors.Traverse_Control) is null; not overriding procedure Visit_Clear_Variable_Action (Self : in out UML_Iterator; Visitor : in out AMF.Visitors.Abstract_Visitor'Class; Element : not null AMF.UML.Clear_Variable_Actions.UML_Clear_Variable_Action_Access; Control : in out AMF.Visitors.Traverse_Control) is null; not overriding procedure Visit_Collaboration (Self : in out UML_Iterator; Visitor : in out AMF.Visitors.Abstract_Visitor'Class; Element : not null AMF.UML.Collaborations.UML_Collaboration_Access; Control : in out AMF.Visitors.Traverse_Control) is null; not overriding procedure Visit_Collaboration_Use (Self : in out UML_Iterator; Visitor : in out AMF.Visitors.Abstract_Visitor'Class; Element : not null AMF.UML.Collaboration_Uses.UML_Collaboration_Use_Access; Control : in out AMF.Visitors.Traverse_Control) is null; not overriding procedure Visit_Combined_Fragment (Self : in out UML_Iterator; Visitor : in out AMF.Visitors.Abstract_Visitor'Class; Element : not null AMF.UML.Combined_Fragments.UML_Combined_Fragment_Access; Control : in out AMF.Visitors.Traverse_Control) is null; not overriding procedure Visit_Comment (Self : in out UML_Iterator; Visitor : in out AMF.Visitors.Abstract_Visitor'Class; Element : not null AMF.UML.Comments.UML_Comment_Access; Control : in out AMF.Visitors.Traverse_Control) is null; not overriding procedure Visit_Communication_Path (Self : in out UML_Iterator; Visitor : in out AMF.Visitors.Abstract_Visitor'Class; Element : not null AMF.UML.Communication_Paths.UML_Communication_Path_Access; Control : in out AMF.Visitors.Traverse_Control) is null; not overriding procedure Visit_Component (Self : in out UML_Iterator; Visitor : in out AMF.Visitors.Abstract_Visitor'Class; Element : not null AMF.UML.Components.UML_Component_Access; Control : in out AMF.Visitors.Traverse_Control) is null; not overriding procedure Visit_Component_Realization (Self : in out UML_Iterator; Visitor : in out AMF.Visitors.Abstract_Visitor'Class; Element : not null AMF.UML.Component_Realizations.UML_Component_Realization_Access; Control : in out AMF.Visitors.Traverse_Control) is null; not overriding procedure Visit_Conditional_Node (Self : in out UML_Iterator; Visitor : in out AMF.Visitors.Abstract_Visitor'Class; Element : not null AMF.UML.Conditional_Nodes.UML_Conditional_Node_Access; Control : in out AMF.Visitors.Traverse_Control) is null; not overriding procedure Visit_Connectable_Element_Template_Parameter (Self : in out UML_Iterator; Visitor : in out AMF.Visitors.Abstract_Visitor'Class; Element : not null AMF.UML.Connectable_Element_Template_Parameters.UML_Connectable_Element_Template_Parameter_Access; Control : in out AMF.Visitors.Traverse_Control) is null; not overriding procedure Visit_Connection_Point_Reference (Self : in out UML_Iterator; Visitor : in out AMF.Visitors.Abstract_Visitor'Class; Element : not null AMF.UML.Connection_Point_References.UML_Connection_Point_Reference_Access; Control : in out AMF.Visitors.Traverse_Control) is null; not overriding procedure Visit_Connector (Self : in out UML_Iterator; Visitor : in out AMF.Visitors.Abstract_Visitor'Class; Element : not null AMF.UML.Connectors.UML_Connector_Access; Control : in out AMF.Visitors.Traverse_Control) is null; not overriding procedure Visit_Connector_End (Self : in out UML_Iterator; Visitor : in out AMF.Visitors.Abstract_Visitor'Class; Element : not null AMF.UML.Connector_Ends.UML_Connector_End_Access; Control : in out AMF.Visitors.Traverse_Control) is null; not overriding procedure Visit_Consider_Ignore_Fragment (Self : in out UML_Iterator; Visitor : in out AMF.Visitors.Abstract_Visitor'Class; Element : not null AMF.UML.Consider_Ignore_Fragments.UML_Consider_Ignore_Fragment_Access; Control : in out AMF.Visitors.Traverse_Control) is null; not overriding procedure Visit_Constraint (Self : in out UML_Iterator; Visitor : in out AMF.Visitors.Abstract_Visitor'Class; Element : not null AMF.UML.Constraints.UML_Constraint_Access; Control : in out AMF.Visitors.Traverse_Control) is null; not overriding procedure Visit_Continuation (Self : in out UML_Iterator; Visitor : in out AMF.Visitors.Abstract_Visitor'Class; Element : not null AMF.UML.Continuations.UML_Continuation_Access; Control : in out AMF.Visitors.Traverse_Control) is null; not overriding procedure Visit_Control_Flow (Self : in out UML_Iterator; Visitor : in out AMF.Visitors.Abstract_Visitor'Class; Element : not null AMF.UML.Control_Flows.UML_Control_Flow_Access; Control : in out AMF.Visitors.Traverse_Control) is null; not overriding procedure Visit_Create_Link_Action (Self : in out UML_Iterator; Visitor : in out AMF.Visitors.Abstract_Visitor'Class; Element : not null AMF.UML.Create_Link_Actions.UML_Create_Link_Action_Access; Control : in out AMF.Visitors.Traverse_Control) is null; not overriding procedure Visit_Create_Link_Object_Action (Self : in out UML_Iterator; Visitor : in out AMF.Visitors.Abstract_Visitor'Class; Element : not null AMF.UML.Create_Link_Object_Actions.UML_Create_Link_Object_Action_Access; Control : in out AMF.Visitors.Traverse_Control) is null; not overriding procedure Visit_Create_Object_Action (Self : in out UML_Iterator; Visitor : in out AMF.Visitors.Abstract_Visitor'Class; Element : not null AMF.UML.Create_Object_Actions.UML_Create_Object_Action_Access; Control : in out AMF.Visitors.Traverse_Control) is null; not overriding procedure Visit_Data_Store_Node (Self : in out UML_Iterator; Visitor : in out AMF.Visitors.Abstract_Visitor'Class; Element : not null AMF.UML.Data_Store_Nodes.UML_Data_Store_Node_Access; Control : in out AMF.Visitors.Traverse_Control) is null; not overriding procedure Visit_Data_Type (Self : in out UML_Iterator; Visitor : in out AMF.Visitors.Abstract_Visitor'Class; Element : not null AMF.UML.Data_Types.UML_Data_Type_Access; Control : in out AMF.Visitors.Traverse_Control) is null; not overriding procedure Visit_Decision_Node (Self : in out UML_Iterator; Visitor : in out AMF.Visitors.Abstract_Visitor'Class; Element : not null AMF.UML.Decision_Nodes.UML_Decision_Node_Access; Control : in out AMF.Visitors.Traverse_Control) is null; not overriding procedure Visit_Dependency (Self : in out UML_Iterator; Visitor : in out AMF.Visitors.Abstract_Visitor'Class; Element : not null AMF.UML.Dependencies.UML_Dependency_Access; Control : in out AMF.Visitors.Traverse_Control) is null; not overriding procedure Visit_Deployment (Self : in out UML_Iterator; Visitor : in out AMF.Visitors.Abstract_Visitor'Class; Element : not null AMF.UML.Deployments.UML_Deployment_Access; Control : in out AMF.Visitors.Traverse_Control) is null; not overriding procedure Visit_Deployment_Specification (Self : in out UML_Iterator; Visitor : in out AMF.Visitors.Abstract_Visitor'Class; Element : not null AMF.UML.Deployment_Specifications.UML_Deployment_Specification_Access; Control : in out AMF.Visitors.Traverse_Control) is null; not overriding procedure Visit_Destroy_Link_Action (Self : in out UML_Iterator; Visitor : in out AMF.Visitors.Abstract_Visitor'Class; Element : not null AMF.UML.Destroy_Link_Actions.UML_Destroy_Link_Action_Access; Control : in out AMF.Visitors.Traverse_Control) is null; not overriding procedure Visit_Destroy_Object_Action (Self : in out UML_Iterator; Visitor : in out AMF.Visitors.Abstract_Visitor'Class; Element : not null AMF.UML.Destroy_Object_Actions.UML_Destroy_Object_Action_Access; Control : in out AMF.Visitors.Traverse_Control) is null; not overriding procedure Visit_Destruction_Occurrence_Specification (Self : in out UML_Iterator; Visitor : in out AMF.Visitors.Abstract_Visitor'Class; Element : not null AMF.UML.Destruction_Occurrence_Specifications.UML_Destruction_Occurrence_Specification_Access; Control : in out AMF.Visitors.Traverse_Control) is null; not overriding procedure Visit_Device (Self : in out UML_Iterator; Visitor : in out AMF.Visitors.Abstract_Visitor'Class; Element : not null AMF.UML.Devices.UML_Device_Access; Control : in out AMF.Visitors.Traverse_Control) is null; not overriding procedure Visit_Duration (Self : in out UML_Iterator; Visitor : in out AMF.Visitors.Abstract_Visitor'Class; Element : not null AMF.UML.Durations.UML_Duration_Access; Control : in out AMF.Visitors.Traverse_Control) is null; not overriding procedure Visit_Duration_Constraint (Self : in out UML_Iterator; Visitor : in out AMF.Visitors.Abstract_Visitor'Class; Element : not null AMF.UML.Duration_Constraints.UML_Duration_Constraint_Access; Control : in out AMF.Visitors.Traverse_Control) is null; not overriding procedure Visit_Duration_Interval (Self : in out UML_Iterator; Visitor : in out AMF.Visitors.Abstract_Visitor'Class; Element : not null AMF.UML.Duration_Intervals.UML_Duration_Interval_Access; Control : in out AMF.Visitors.Traverse_Control) is null; not overriding procedure Visit_Duration_Observation (Self : in out UML_Iterator; Visitor : in out AMF.Visitors.Abstract_Visitor'Class; Element : not null AMF.UML.Duration_Observations.UML_Duration_Observation_Access; Control : in out AMF.Visitors.Traverse_Control) is null; not overriding procedure Visit_Element_Import (Self : in out UML_Iterator; Visitor : in out AMF.Visitors.Abstract_Visitor'Class; Element : not null AMF.UML.Element_Imports.UML_Element_Import_Access; Control : in out AMF.Visitors.Traverse_Control) is null; not overriding procedure Visit_Enumeration (Self : in out UML_Iterator; Visitor : in out AMF.Visitors.Abstract_Visitor'Class; Element : not null AMF.UML.Enumerations.UML_Enumeration_Access; Control : in out AMF.Visitors.Traverse_Control) is null; not overriding procedure Visit_Enumeration_Literal (Self : in out UML_Iterator; Visitor : in out AMF.Visitors.Abstract_Visitor'Class; Element : not null AMF.UML.Enumeration_Literals.UML_Enumeration_Literal_Access; Control : in out AMF.Visitors.Traverse_Control) is null; not overriding procedure Visit_Exception_Handler (Self : in out UML_Iterator; Visitor : in out AMF.Visitors.Abstract_Visitor'Class; Element : not null AMF.UML.Exception_Handlers.UML_Exception_Handler_Access; Control : in out AMF.Visitors.Traverse_Control) is null; not overriding procedure Visit_Execution_Environment (Self : in out UML_Iterator; Visitor : in out AMF.Visitors.Abstract_Visitor'Class; Element : not null AMF.UML.Execution_Environments.UML_Execution_Environment_Access; Control : in out AMF.Visitors.Traverse_Control) is null; not overriding procedure Visit_Execution_Occurrence_Specification (Self : in out UML_Iterator; Visitor : in out AMF.Visitors.Abstract_Visitor'Class; Element : not null AMF.UML.Execution_Occurrence_Specifications.UML_Execution_Occurrence_Specification_Access; Control : in out AMF.Visitors.Traverse_Control) is null; not overriding procedure Visit_Expansion_Node (Self : in out UML_Iterator; Visitor : in out AMF.Visitors.Abstract_Visitor'Class; Element : not null AMF.UML.Expansion_Nodes.UML_Expansion_Node_Access; Control : in out AMF.Visitors.Traverse_Control) is null; not overriding procedure Visit_Expansion_Region (Self : in out UML_Iterator; Visitor : in out AMF.Visitors.Abstract_Visitor'Class; Element : not null AMF.UML.Expansion_Regions.UML_Expansion_Region_Access; Control : in out AMF.Visitors.Traverse_Control) is null; not overriding procedure Visit_Expression (Self : in out UML_Iterator; Visitor : in out AMF.Visitors.Abstract_Visitor'Class; Element : not null AMF.UML.Expressions.UML_Expression_Access; Control : in out AMF.Visitors.Traverse_Control) is null; not overriding procedure Visit_Extend (Self : in out UML_Iterator; Visitor : in out AMF.Visitors.Abstract_Visitor'Class; Element : not null AMF.UML.Extends.UML_Extend_Access; Control : in out AMF.Visitors.Traverse_Control) is null; not overriding procedure Visit_Extension (Self : in out UML_Iterator; Visitor : in out AMF.Visitors.Abstract_Visitor'Class; Element : not null AMF.UML.Extensions.UML_Extension_Access; Control : in out AMF.Visitors.Traverse_Control) is null; not overriding procedure Visit_Extension_End (Self : in out UML_Iterator; Visitor : in out AMF.Visitors.Abstract_Visitor'Class; Element : not null AMF.UML.Extension_Ends.UML_Extension_End_Access; Control : in out AMF.Visitors.Traverse_Control) is null; not overriding procedure Visit_Extension_Point (Self : in out UML_Iterator; Visitor : in out AMF.Visitors.Abstract_Visitor'Class; Element : not null AMF.UML.Extension_Points.UML_Extension_Point_Access; Control : in out AMF.Visitors.Traverse_Control) is null; not overriding procedure Visit_Final_State (Self : in out UML_Iterator; Visitor : in out AMF.Visitors.Abstract_Visitor'Class; Element : not null AMF.UML.Final_States.UML_Final_State_Access; Control : in out AMF.Visitors.Traverse_Control) is null; not overriding procedure Visit_Flow_Final_Node (Self : in out UML_Iterator; Visitor : in out AMF.Visitors.Abstract_Visitor'Class; Element : not null AMF.UML.Flow_Final_Nodes.UML_Flow_Final_Node_Access; Control : in out AMF.Visitors.Traverse_Control) is null; not overriding procedure Visit_Fork_Node (Self : in out UML_Iterator; Visitor : in out AMF.Visitors.Abstract_Visitor'Class; Element : not null AMF.UML.Fork_Nodes.UML_Fork_Node_Access; Control : in out AMF.Visitors.Traverse_Control) is null; not overriding procedure Visit_Function_Behavior (Self : in out UML_Iterator; Visitor : in out AMF.Visitors.Abstract_Visitor'Class; Element : not null AMF.UML.Function_Behaviors.UML_Function_Behavior_Access; Control : in out AMF.Visitors.Traverse_Control) is null; not overriding procedure Visit_Gate (Self : in out UML_Iterator; Visitor : in out AMF.Visitors.Abstract_Visitor'Class; Element : not null AMF.UML.Gates.UML_Gate_Access; Control : in out AMF.Visitors.Traverse_Control) is null; not overriding procedure Visit_General_Ordering (Self : in out UML_Iterator; Visitor : in out AMF.Visitors.Abstract_Visitor'Class; Element : not null AMF.UML.General_Orderings.UML_General_Ordering_Access; Control : in out AMF.Visitors.Traverse_Control) is null; not overriding procedure Visit_Generalization (Self : in out UML_Iterator; Visitor : in out AMF.Visitors.Abstract_Visitor'Class; Element : not null AMF.UML.Generalizations.UML_Generalization_Access; Control : in out AMF.Visitors.Traverse_Control) is null; not overriding procedure Visit_Generalization_Set (Self : in out UML_Iterator; Visitor : in out AMF.Visitors.Abstract_Visitor'Class; Element : not null AMF.UML.Generalization_Sets.UML_Generalization_Set_Access; Control : in out AMF.Visitors.Traverse_Control) is null; not overriding procedure Visit_Image (Self : in out UML_Iterator; Visitor : in out AMF.Visitors.Abstract_Visitor'Class; Element : not null AMF.UML.Images.UML_Image_Access; Control : in out AMF.Visitors.Traverse_Control) is null; not overriding procedure Visit_Include (Self : in out UML_Iterator; Visitor : in out AMF.Visitors.Abstract_Visitor'Class; Element : not null AMF.UML.Includes.UML_Include_Access; Control : in out AMF.Visitors.Traverse_Control) is null; not overriding procedure Visit_Information_Flow (Self : in out UML_Iterator; Visitor : in out AMF.Visitors.Abstract_Visitor'Class; Element : not null AMF.UML.Information_Flows.UML_Information_Flow_Access; Control : in out AMF.Visitors.Traverse_Control) is null; not overriding procedure Visit_Information_Item (Self : in out UML_Iterator; Visitor : in out AMF.Visitors.Abstract_Visitor'Class; Element : not null AMF.UML.Information_Items.UML_Information_Item_Access; Control : in out AMF.Visitors.Traverse_Control) is null; not overriding procedure Visit_Initial_Node (Self : in out UML_Iterator; Visitor : in out AMF.Visitors.Abstract_Visitor'Class; Element : not null AMF.UML.Initial_Nodes.UML_Initial_Node_Access; Control : in out AMF.Visitors.Traverse_Control) is null; not overriding procedure Visit_Input_Pin (Self : in out UML_Iterator; Visitor : in out AMF.Visitors.Abstract_Visitor'Class; Element : not null AMF.UML.Input_Pins.UML_Input_Pin_Access; Control : in out AMF.Visitors.Traverse_Control) is null; not overriding procedure Visit_Instance_Specification (Self : in out UML_Iterator; Visitor : in out AMF.Visitors.Abstract_Visitor'Class; Element : not null AMF.UML.Instance_Specifications.UML_Instance_Specification_Access; Control : in out AMF.Visitors.Traverse_Control) is null; not overriding procedure Visit_Instance_Value (Self : in out UML_Iterator; Visitor : in out AMF.Visitors.Abstract_Visitor'Class; Element : not null AMF.UML.Instance_Values.UML_Instance_Value_Access; Control : in out AMF.Visitors.Traverse_Control) is null; not overriding procedure Visit_Interaction (Self : in out UML_Iterator; Visitor : in out AMF.Visitors.Abstract_Visitor'Class; Element : not null AMF.UML.Interactions.UML_Interaction_Access; Control : in out AMF.Visitors.Traverse_Control) is null; not overriding procedure Visit_Interaction_Constraint (Self : in out UML_Iterator; Visitor : in out AMF.Visitors.Abstract_Visitor'Class; Element : not null AMF.UML.Interaction_Constraints.UML_Interaction_Constraint_Access; Control : in out AMF.Visitors.Traverse_Control) is null; not overriding procedure Visit_Interaction_Operand (Self : in out UML_Iterator; Visitor : in out AMF.Visitors.Abstract_Visitor'Class; Element : not null AMF.UML.Interaction_Operands.UML_Interaction_Operand_Access; Control : in out AMF.Visitors.Traverse_Control) is null; not overriding procedure Visit_Interaction_Use (Self : in out UML_Iterator; Visitor : in out AMF.Visitors.Abstract_Visitor'Class; Element : not null AMF.UML.Interaction_Uses.UML_Interaction_Use_Access; Control : in out AMF.Visitors.Traverse_Control) is null; not overriding procedure Visit_Interface (Self : in out UML_Iterator; Visitor : in out AMF.Visitors.Abstract_Visitor'Class; Element : not null AMF.UML.Interfaces.UML_Interface_Access; Control : in out AMF.Visitors.Traverse_Control) is null; not overriding procedure Visit_Interface_Realization (Self : in out UML_Iterator; Visitor : in out AMF.Visitors.Abstract_Visitor'Class; Element : not null AMF.UML.Interface_Realizations.UML_Interface_Realization_Access; Control : in out AMF.Visitors.Traverse_Control) is null; not overriding procedure Visit_Interruptible_Activity_Region (Self : in out UML_Iterator; Visitor : in out AMF.Visitors.Abstract_Visitor'Class; Element : not null AMF.UML.Interruptible_Activity_Regions.UML_Interruptible_Activity_Region_Access; Control : in out AMF.Visitors.Traverse_Control) is null; not overriding procedure Visit_Interval (Self : in out UML_Iterator; Visitor : in out AMF.Visitors.Abstract_Visitor'Class; Element : not null AMF.UML.Intervals.UML_Interval_Access; Control : in out AMF.Visitors.Traverse_Control) is null; not overriding procedure Visit_Interval_Constraint (Self : in out UML_Iterator; Visitor : in out AMF.Visitors.Abstract_Visitor'Class; Element : not null AMF.UML.Interval_Constraints.UML_Interval_Constraint_Access; Control : in out AMF.Visitors.Traverse_Control) is null; not overriding procedure Visit_Join_Node (Self : in out UML_Iterator; Visitor : in out AMF.Visitors.Abstract_Visitor'Class; Element : not null AMF.UML.Join_Nodes.UML_Join_Node_Access; Control : in out AMF.Visitors.Traverse_Control) is null; not overriding procedure Visit_Lifeline (Self : in out UML_Iterator; Visitor : in out AMF.Visitors.Abstract_Visitor'Class; Element : not null AMF.UML.Lifelines.UML_Lifeline_Access; Control : in out AMF.Visitors.Traverse_Control) is null; not overriding procedure Visit_Link_End_Creation_Data (Self : in out UML_Iterator; Visitor : in out AMF.Visitors.Abstract_Visitor'Class; Element : not null AMF.UML.Link_End_Creation_Datas.UML_Link_End_Creation_Data_Access; Control : in out AMF.Visitors.Traverse_Control) is null; not overriding procedure Visit_Link_End_Data (Self : in out UML_Iterator; Visitor : in out AMF.Visitors.Abstract_Visitor'Class; Element : not null AMF.UML.Link_End_Datas.UML_Link_End_Data_Access; Control : in out AMF.Visitors.Traverse_Control) is null; not overriding procedure Visit_Link_End_Destruction_Data (Self : in out UML_Iterator; Visitor : in out AMF.Visitors.Abstract_Visitor'Class; Element : not null AMF.UML.Link_End_Destruction_Datas.UML_Link_End_Destruction_Data_Access; Control : in out AMF.Visitors.Traverse_Control) is null; not overriding procedure Visit_Literal_Boolean (Self : in out UML_Iterator; Visitor : in out AMF.Visitors.Abstract_Visitor'Class; Element : not null AMF.UML.Literal_Booleans.UML_Literal_Boolean_Access; Control : in out AMF.Visitors.Traverse_Control) is null; not overriding procedure Visit_Literal_Integer (Self : in out UML_Iterator; Visitor : in out AMF.Visitors.Abstract_Visitor'Class; Element : not null AMF.UML.Literal_Integers.UML_Literal_Integer_Access; Control : in out AMF.Visitors.Traverse_Control) is null; not overriding procedure Visit_Literal_Null (Self : in out UML_Iterator; Visitor : in out AMF.Visitors.Abstract_Visitor'Class; Element : not null AMF.UML.Literal_Nulls.UML_Literal_Null_Access; Control : in out AMF.Visitors.Traverse_Control) is null; not overriding procedure Visit_Literal_Real (Self : in out UML_Iterator; Visitor : in out AMF.Visitors.Abstract_Visitor'Class; Element : not null AMF.UML.Literal_Reals.UML_Literal_Real_Access; Control : in out AMF.Visitors.Traverse_Control) is null; not overriding procedure Visit_Literal_String (Self : in out UML_Iterator; Visitor : in out AMF.Visitors.Abstract_Visitor'Class; Element : not null AMF.UML.Literal_Strings.UML_Literal_String_Access; Control : in out AMF.Visitors.Traverse_Control) is null; not overriding procedure Visit_Literal_Unlimited_Natural (Self : in out UML_Iterator; Visitor : in out AMF.Visitors.Abstract_Visitor'Class; Element : not null AMF.UML.Literal_Unlimited_Naturals.UML_Literal_Unlimited_Natural_Access; Control : in out AMF.Visitors.Traverse_Control) is null; not overriding procedure Visit_Loop_Node (Self : in out UML_Iterator; Visitor : in out AMF.Visitors.Abstract_Visitor'Class; Element : not null AMF.UML.Loop_Nodes.UML_Loop_Node_Access; Control : in out AMF.Visitors.Traverse_Control) is null; not overriding procedure Visit_Manifestation (Self : in out UML_Iterator; Visitor : in out AMF.Visitors.Abstract_Visitor'Class; Element : not null AMF.UML.Manifestations.UML_Manifestation_Access; Control : in out AMF.Visitors.Traverse_Control) is null; not overriding procedure Visit_Merge_Node (Self : in out UML_Iterator; Visitor : in out AMF.Visitors.Abstract_Visitor'Class; Element : not null AMF.UML.Merge_Nodes.UML_Merge_Node_Access; Control : in out AMF.Visitors.Traverse_Control) is null; not overriding procedure Visit_Message (Self : in out UML_Iterator; Visitor : in out AMF.Visitors.Abstract_Visitor'Class; Element : not null AMF.UML.Messages.UML_Message_Access; Control : in out AMF.Visitors.Traverse_Control) is null; not overriding procedure Visit_Message_Occurrence_Specification (Self : in out UML_Iterator; Visitor : in out AMF.Visitors.Abstract_Visitor'Class; Element : not null AMF.UML.Message_Occurrence_Specifications.UML_Message_Occurrence_Specification_Access; Control : in out AMF.Visitors.Traverse_Control) is null; not overriding procedure Visit_Model (Self : in out UML_Iterator; Visitor : in out AMF.Visitors.Abstract_Visitor'Class; Element : not null AMF.UML.Models.UML_Model_Access; Control : in out AMF.Visitors.Traverse_Control) is null; not overriding procedure Visit_Node (Self : in out UML_Iterator; Visitor : in out AMF.Visitors.Abstract_Visitor'Class; Element : not null AMF.UML.Nodes.UML_Node_Access; Control : in out AMF.Visitors.Traverse_Control) is null; not overriding procedure Visit_Object_Flow (Self : in out UML_Iterator; Visitor : in out AMF.Visitors.Abstract_Visitor'Class; Element : not null AMF.UML.Object_Flows.UML_Object_Flow_Access; Control : in out AMF.Visitors.Traverse_Control) is null; not overriding procedure Visit_Occurrence_Specification (Self : in out UML_Iterator; Visitor : in out AMF.Visitors.Abstract_Visitor'Class; Element : not null AMF.UML.Occurrence_Specifications.UML_Occurrence_Specification_Access; Control : in out AMF.Visitors.Traverse_Control) is null; not overriding procedure Visit_Opaque_Action (Self : in out UML_Iterator; Visitor : in out AMF.Visitors.Abstract_Visitor'Class; Element : not null AMF.UML.Opaque_Actions.UML_Opaque_Action_Access; Control : in out AMF.Visitors.Traverse_Control) is null; not overriding procedure Visit_Opaque_Behavior (Self : in out UML_Iterator; Visitor : in out AMF.Visitors.Abstract_Visitor'Class; Element : not null AMF.UML.Opaque_Behaviors.UML_Opaque_Behavior_Access; Control : in out AMF.Visitors.Traverse_Control) is null; not overriding procedure Visit_Opaque_Expression (Self : in out UML_Iterator; Visitor : in out AMF.Visitors.Abstract_Visitor'Class; Element : not null AMF.UML.Opaque_Expressions.UML_Opaque_Expression_Access; Control : in out AMF.Visitors.Traverse_Control) is null; not overriding procedure Visit_Operation (Self : in out UML_Iterator; Visitor : in out AMF.Visitors.Abstract_Visitor'Class; Element : not null AMF.UML.Operations.UML_Operation_Access; Control : in out AMF.Visitors.Traverse_Control) is null; not overriding procedure Visit_Operation_Template_Parameter (Self : in out UML_Iterator; Visitor : in out AMF.Visitors.Abstract_Visitor'Class; Element : not null AMF.UML.Operation_Template_Parameters.UML_Operation_Template_Parameter_Access; Control : in out AMF.Visitors.Traverse_Control) is null; not overriding procedure Visit_Output_Pin (Self : in out UML_Iterator; Visitor : in out AMF.Visitors.Abstract_Visitor'Class; Element : not null AMF.UML.Output_Pins.UML_Output_Pin_Access; Control : in out AMF.Visitors.Traverse_Control) is null; not overriding procedure Visit_Package (Self : in out UML_Iterator; Visitor : in out AMF.Visitors.Abstract_Visitor'Class; Element : not null AMF.UML.Packages.UML_Package_Access; Control : in out AMF.Visitors.Traverse_Control) is null; not overriding procedure Visit_Package_Import (Self : in out UML_Iterator; Visitor : in out AMF.Visitors.Abstract_Visitor'Class; Element : not null AMF.UML.Package_Imports.UML_Package_Import_Access; Control : in out AMF.Visitors.Traverse_Control) is null; not overriding procedure Visit_Package_Merge (Self : in out UML_Iterator; Visitor : in out AMF.Visitors.Abstract_Visitor'Class; Element : not null AMF.UML.Package_Merges.UML_Package_Merge_Access; Control : in out AMF.Visitors.Traverse_Control) is null; not overriding procedure Visit_Parameter (Self : in out UML_Iterator; Visitor : in out AMF.Visitors.Abstract_Visitor'Class; Element : not null AMF.UML.Parameters.UML_Parameter_Access; Control : in out AMF.Visitors.Traverse_Control) is null; not overriding procedure Visit_Parameter_Set (Self : in out UML_Iterator; Visitor : in out AMF.Visitors.Abstract_Visitor'Class; Element : not null AMF.UML.Parameter_Sets.UML_Parameter_Set_Access; Control : in out AMF.Visitors.Traverse_Control) is null; not overriding procedure Visit_Part_Decomposition (Self : in out UML_Iterator; Visitor : in out AMF.Visitors.Abstract_Visitor'Class; Element : not null AMF.UML.Part_Decompositions.UML_Part_Decomposition_Access; Control : in out AMF.Visitors.Traverse_Control) is null; not overriding procedure Visit_Port (Self : in out UML_Iterator; Visitor : in out AMF.Visitors.Abstract_Visitor'Class; Element : not null AMF.UML.Ports.UML_Port_Access; Control : in out AMF.Visitors.Traverse_Control) is null; not overriding procedure Visit_Primitive_Type (Self : in out UML_Iterator; Visitor : in out AMF.Visitors.Abstract_Visitor'Class; Element : not null AMF.UML.Primitive_Types.UML_Primitive_Type_Access; Control : in out AMF.Visitors.Traverse_Control) is null; not overriding procedure Visit_Profile (Self : in out UML_Iterator; Visitor : in out AMF.Visitors.Abstract_Visitor'Class; Element : not null AMF.UML.Profiles.UML_Profile_Access; Control : in out AMF.Visitors.Traverse_Control) is null; not overriding procedure Visit_Profile_Application (Self : in out UML_Iterator; Visitor : in out AMF.Visitors.Abstract_Visitor'Class; Element : not null AMF.UML.Profile_Applications.UML_Profile_Application_Access; Control : in out AMF.Visitors.Traverse_Control) is null; not overriding procedure Visit_Property (Self : in out UML_Iterator; Visitor : in out AMF.Visitors.Abstract_Visitor'Class; Element : not null AMF.UML.Properties.UML_Property_Access; Control : in out AMF.Visitors.Traverse_Control) is null; not overriding procedure Visit_Protocol_Conformance (Self : in out UML_Iterator; Visitor : in out AMF.Visitors.Abstract_Visitor'Class; Element : not null AMF.UML.Protocol_Conformances.UML_Protocol_Conformance_Access; Control : in out AMF.Visitors.Traverse_Control) is null; not overriding procedure Visit_Protocol_State_Machine (Self : in out UML_Iterator; Visitor : in out AMF.Visitors.Abstract_Visitor'Class; Element : not null AMF.UML.Protocol_State_Machines.UML_Protocol_State_Machine_Access; Control : in out AMF.Visitors.Traverse_Control) is null; not overriding procedure Visit_Protocol_Transition (Self : in out UML_Iterator; Visitor : in out AMF.Visitors.Abstract_Visitor'Class; Element : not null AMF.UML.Protocol_Transitions.UML_Protocol_Transition_Access; Control : in out AMF.Visitors.Traverse_Control) is null; not overriding procedure Visit_Pseudostate (Self : in out UML_Iterator; Visitor : in out AMF.Visitors.Abstract_Visitor'Class; Element : not null AMF.UML.Pseudostates.UML_Pseudostate_Access; Control : in out AMF.Visitors.Traverse_Control) is null; not overriding procedure Visit_Qualifier_Value (Self : in out UML_Iterator; Visitor : in out AMF.Visitors.Abstract_Visitor'Class; Element : not null AMF.UML.Qualifier_Values.UML_Qualifier_Value_Access; Control : in out AMF.Visitors.Traverse_Control) is null; not overriding procedure Visit_Raise_Exception_Action (Self : in out UML_Iterator; Visitor : in out AMF.Visitors.Abstract_Visitor'Class; Element : not null AMF.UML.Raise_Exception_Actions.UML_Raise_Exception_Action_Access; Control : in out AMF.Visitors.Traverse_Control) is null; not overriding procedure Visit_Read_Extent_Action (Self : in out UML_Iterator; Visitor : in out AMF.Visitors.Abstract_Visitor'Class; Element : not null AMF.UML.Read_Extent_Actions.UML_Read_Extent_Action_Access; Control : in out AMF.Visitors.Traverse_Control) is null; not overriding procedure Visit_Read_Is_Classified_Object_Action (Self : in out UML_Iterator; Visitor : in out AMF.Visitors.Abstract_Visitor'Class; Element : not null AMF.UML.Read_Is_Classified_Object_Actions.UML_Read_Is_Classified_Object_Action_Access; Control : in out AMF.Visitors.Traverse_Control) is null; not overriding procedure Visit_Read_Link_Action (Self : in out UML_Iterator; Visitor : in out AMF.Visitors.Abstract_Visitor'Class; Element : not null AMF.UML.Read_Link_Actions.UML_Read_Link_Action_Access; Control : in out AMF.Visitors.Traverse_Control) is null; not overriding procedure Visit_Read_Link_Object_End_Action (Self : in out UML_Iterator; Visitor : in out AMF.Visitors.Abstract_Visitor'Class; Element : not null AMF.UML.Read_Link_Object_End_Actions.UML_Read_Link_Object_End_Action_Access; Control : in out AMF.Visitors.Traverse_Control) is null; not overriding procedure Visit_Read_Link_Object_End_Qualifier_Action (Self : in out UML_Iterator; Visitor : in out AMF.Visitors.Abstract_Visitor'Class; Element : not null AMF.UML.Read_Link_Object_End_Qualifier_Actions.UML_Read_Link_Object_End_Qualifier_Action_Access; Control : in out AMF.Visitors.Traverse_Control) is null; not overriding procedure Visit_Read_Self_Action (Self : in out UML_Iterator; Visitor : in out AMF.Visitors.Abstract_Visitor'Class; Element : not null AMF.UML.Read_Self_Actions.UML_Read_Self_Action_Access; Control : in out AMF.Visitors.Traverse_Control) is null; not overriding procedure Visit_Read_Structural_Feature_Action (Self : in out UML_Iterator; Visitor : in out AMF.Visitors.Abstract_Visitor'Class; Element : not null AMF.UML.Read_Structural_Feature_Actions.UML_Read_Structural_Feature_Action_Access; Control : in out AMF.Visitors.Traverse_Control) is null; not overriding procedure Visit_Read_Variable_Action (Self : in out UML_Iterator; Visitor : in out AMF.Visitors.Abstract_Visitor'Class; Element : not null AMF.UML.Read_Variable_Actions.UML_Read_Variable_Action_Access; Control : in out AMF.Visitors.Traverse_Control) is null; not overriding procedure Visit_Realization (Self : in out UML_Iterator; Visitor : in out AMF.Visitors.Abstract_Visitor'Class; Element : not null AMF.UML.Realizations.UML_Realization_Access; Control : in out AMF.Visitors.Traverse_Control) is null; not overriding procedure Visit_Reception (Self : in out UML_Iterator; Visitor : in out AMF.Visitors.Abstract_Visitor'Class; Element : not null AMF.UML.Receptions.UML_Reception_Access; Control : in out AMF.Visitors.Traverse_Control) is null; not overriding procedure Visit_Reclassify_Object_Action (Self : in out UML_Iterator; Visitor : in out AMF.Visitors.Abstract_Visitor'Class; Element : not null AMF.UML.Reclassify_Object_Actions.UML_Reclassify_Object_Action_Access; Control : in out AMF.Visitors.Traverse_Control) is null; not overriding procedure Visit_Redefinable_Template_Signature (Self : in out UML_Iterator; Visitor : in out AMF.Visitors.Abstract_Visitor'Class; Element : not null AMF.UML.Redefinable_Template_Signatures.UML_Redefinable_Template_Signature_Access; Control : in out AMF.Visitors.Traverse_Control) is null; not overriding procedure Visit_Reduce_Action (Self : in out UML_Iterator; Visitor : in out AMF.Visitors.Abstract_Visitor'Class; Element : not null AMF.UML.Reduce_Actions.UML_Reduce_Action_Access; Control : in out AMF.Visitors.Traverse_Control) is null; not overriding procedure Visit_Region (Self : in out UML_Iterator; Visitor : in out AMF.Visitors.Abstract_Visitor'Class; Element : not null AMF.UML.Regions.UML_Region_Access; Control : in out AMF.Visitors.Traverse_Control) is null; not overriding procedure Visit_Remove_Structural_Feature_Value_Action (Self : in out UML_Iterator; Visitor : in out AMF.Visitors.Abstract_Visitor'Class; Element : not null AMF.UML.Remove_Structural_Feature_Value_Actions.UML_Remove_Structural_Feature_Value_Action_Access; Control : in out AMF.Visitors.Traverse_Control) is null; not overriding procedure Visit_Remove_Variable_Value_Action (Self : in out UML_Iterator; Visitor : in out AMF.Visitors.Abstract_Visitor'Class; Element : not null AMF.UML.Remove_Variable_Value_Actions.UML_Remove_Variable_Value_Action_Access; Control : in out AMF.Visitors.Traverse_Control) is null; not overriding procedure Visit_Reply_Action (Self : in out UML_Iterator; Visitor : in out AMF.Visitors.Abstract_Visitor'Class; Element : not null AMF.UML.Reply_Actions.UML_Reply_Action_Access; Control : in out AMF.Visitors.Traverse_Control) is null; not overriding procedure Visit_Send_Object_Action (Self : in out UML_Iterator; Visitor : in out AMF.Visitors.Abstract_Visitor'Class; Element : not null AMF.UML.Send_Object_Actions.UML_Send_Object_Action_Access; Control : in out AMF.Visitors.Traverse_Control) is null; not overriding procedure Visit_Send_Signal_Action (Self : in out UML_Iterator; Visitor : in out AMF.Visitors.Abstract_Visitor'Class; Element : not null AMF.UML.Send_Signal_Actions.UML_Send_Signal_Action_Access; Control : in out AMF.Visitors.Traverse_Control) is null; not overriding procedure Visit_Sequence_Node (Self : in out UML_Iterator; Visitor : in out AMF.Visitors.Abstract_Visitor'Class; Element : not null AMF.UML.Sequence_Nodes.UML_Sequence_Node_Access; Control : in out AMF.Visitors.Traverse_Control) is null; not overriding procedure Visit_Signal (Self : in out UML_Iterator; Visitor : in out AMF.Visitors.Abstract_Visitor'Class; Element : not null AMF.UML.Signals.UML_Signal_Access; Control : in out AMF.Visitors.Traverse_Control) is null; not overriding procedure Visit_Signal_Event (Self : in out UML_Iterator; Visitor : in out AMF.Visitors.Abstract_Visitor'Class; Element : not null AMF.UML.Signal_Events.UML_Signal_Event_Access; Control : in out AMF.Visitors.Traverse_Control) is null; not overriding procedure Visit_Slot (Self : in out UML_Iterator; Visitor : in out AMF.Visitors.Abstract_Visitor'Class; Element : not null AMF.UML.Slots.UML_Slot_Access; Control : in out AMF.Visitors.Traverse_Control) is null; not overriding procedure Visit_Start_Classifier_Behavior_Action (Self : in out UML_Iterator; Visitor : in out AMF.Visitors.Abstract_Visitor'Class; Element : not null AMF.UML.Start_Classifier_Behavior_Actions.UML_Start_Classifier_Behavior_Action_Access; Control : in out AMF.Visitors.Traverse_Control) is null; not overriding procedure Visit_Start_Object_Behavior_Action (Self : in out UML_Iterator; Visitor : in out AMF.Visitors.Abstract_Visitor'Class; Element : not null AMF.UML.Start_Object_Behavior_Actions.UML_Start_Object_Behavior_Action_Access; Control : in out AMF.Visitors.Traverse_Control) is null; not overriding procedure Visit_State (Self : in out UML_Iterator; Visitor : in out AMF.Visitors.Abstract_Visitor'Class; Element : not null AMF.UML.States.UML_State_Access; Control : in out AMF.Visitors.Traverse_Control) is null; not overriding procedure Visit_State_Invariant (Self : in out UML_Iterator; Visitor : in out AMF.Visitors.Abstract_Visitor'Class; Element : not null AMF.UML.State_Invariants.UML_State_Invariant_Access; Control : in out AMF.Visitors.Traverse_Control) is null; not overriding procedure Visit_State_Machine (Self : in out UML_Iterator; Visitor : in out AMF.Visitors.Abstract_Visitor'Class; Element : not null AMF.UML.State_Machines.UML_State_Machine_Access; Control : in out AMF.Visitors.Traverse_Control) is null; not overriding procedure Visit_Stereotype (Self : in out UML_Iterator; Visitor : in out AMF.Visitors.Abstract_Visitor'Class; Element : not null AMF.UML.Stereotypes.UML_Stereotype_Access; Control : in out AMF.Visitors.Traverse_Control) is null; not overriding procedure Visit_String_Expression (Self : in out UML_Iterator; Visitor : in out AMF.Visitors.Abstract_Visitor'Class; Element : not null AMF.UML.String_Expressions.UML_String_Expression_Access; Control : in out AMF.Visitors.Traverse_Control) is null; not overriding procedure Visit_Structured_Activity_Node (Self : in out UML_Iterator; Visitor : in out AMF.Visitors.Abstract_Visitor'Class; Element : not null AMF.UML.Structured_Activity_Nodes.UML_Structured_Activity_Node_Access; Control : in out AMF.Visitors.Traverse_Control) is null; not overriding procedure Visit_Substitution (Self : in out UML_Iterator; Visitor : in out AMF.Visitors.Abstract_Visitor'Class; Element : not null AMF.UML.Substitutions.UML_Substitution_Access; Control : in out AMF.Visitors.Traverse_Control) is null; not overriding procedure Visit_Template_Binding (Self : in out UML_Iterator; Visitor : in out AMF.Visitors.Abstract_Visitor'Class; Element : not null AMF.UML.Template_Bindings.UML_Template_Binding_Access; Control : in out AMF.Visitors.Traverse_Control) is null; not overriding procedure Visit_Template_Parameter (Self : in out UML_Iterator; Visitor : in out AMF.Visitors.Abstract_Visitor'Class; Element : not null AMF.UML.Template_Parameters.UML_Template_Parameter_Access; Control : in out AMF.Visitors.Traverse_Control) is null; not overriding procedure Visit_Template_Parameter_Substitution (Self : in out UML_Iterator; Visitor : in out AMF.Visitors.Abstract_Visitor'Class; Element : not null AMF.UML.Template_Parameter_Substitutions.UML_Template_Parameter_Substitution_Access; Control : in out AMF.Visitors.Traverse_Control) is null; not overriding procedure Visit_Template_Signature (Self : in out UML_Iterator; Visitor : in out AMF.Visitors.Abstract_Visitor'Class; Element : not null AMF.UML.Template_Signatures.UML_Template_Signature_Access; Control : in out AMF.Visitors.Traverse_Control) is null; not overriding procedure Visit_Test_Identity_Action (Self : in out UML_Iterator; Visitor : in out AMF.Visitors.Abstract_Visitor'Class; Element : not null AMF.UML.Test_Identity_Actions.UML_Test_Identity_Action_Access; Control : in out AMF.Visitors.Traverse_Control) is null; not overriding procedure Visit_Time_Constraint (Self : in out UML_Iterator; Visitor : in out AMF.Visitors.Abstract_Visitor'Class; Element : not null AMF.UML.Time_Constraints.UML_Time_Constraint_Access; Control : in out AMF.Visitors.Traverse_Control) is null; not overriding procedure Visit_Time_Event (Self : in out UML_Iterator; Visitor : in out AMF.Visitors.Abstract_Visitor'Class; Element : not null AMF.UML.Time_Events.UML_Time_Event_Access; Control : in out AMF.Visitors.Traverse_Control) is null; not overriding procedure Visit_Time_Expression (Self : in out UML_Iterator; Visitor : in out AMF.Visitors.Abstract_Visitor'Class; Element : not null AMF.UML.Time_Expressions.UML_Time_Expression_Access; Control : in out AMF.Visitors.Traverse_Control) is null; not overriding procedure Visit_Time_Interval (Self : in out UML_Iterator; Visitor : in out AMF.Visitors.Abstract_Visitor'Class; Element : not null AMF.UML.Time_Intervals.UML_Time_Interval_Access; Control : in out AMF.Visitors.Traverse_Control) is null; not overriding procedure Visit_Time_Observation (Self : in out UML_Iterator; Visitor : in out AMF.Visitors.Abstract_Visitor'Class; Element : not null AMF.UML.Time_Observations.UML_Time_Observation_Access; Control : in out AMF.Visitors.Traverse_Control) is null; not overriding procedure Visit_Transition (Self : in out UML_Iterator; Visitor : in out AMF.Visitors.Abstract_Visitor'Class; Element : not null AMF.UML.Transitions.UML_Transition_Access; Control : in out AMF.Visitors.Traverse_Control) is null; not overriding procedure Visit_Trigger (Self : in out UML_Iterator; Visitor : in out AMF.Visitors.Abstract_Visitor'Class; Element : not null AMF.UML.Triggers.UML_Trigger_Access; Control : in out AMF.Visitors.Traverse_Control) is null; not overriding procedure Visit_Unmarshall_Action (Self : in out UML_Iterator; Visitor : in out AMF.Visitors.Abstract_Visitor'Class; Element : not null AMF.UML.Unmarshall_Actions.UML_Unmarshall_Action_Access; Control : in out AMF.Visitors.Traverse_Control) is null; not overriding procedure Visit_Usage (Self : in out UML_Iterator; Visitor : in out AMF.Visitors.Abstract_Visitor'Class; Element : not null AMF.UML.Usages.UML_Usage_Access; Control : in out AMF.Visitors.Traverse_Control) is null; not overriding procedure Visit_Use_Case (Self : in out UML_Iterator; Visitor : in out AMF.Visitors.Abstract_Visitor'Class; Element : not null AMF.UML.Use_Cases.UML_Use_Case_Access; Control : in out AMF.Visitors.Traverse_Control) is null; not overriding procedure Visit_Value_Pin (Self : in out UML_Iterator; Visitor : in out AMF.Visitors.Abstract_Visitor'Class; Element : not null AMF.UML.Value_Pins.UML_Value_Pin_Access; Control : in out AMF.Visitors.Traverse_Control) is null; not overriding procedure Visit_Value_Specification_Action (Self : in out UML_Iterator; Visitor : in out AMF.Visitors.Abstract_Visitor'Class; Element : not null AMF.UML.Value_Specification_Actions.UML_Value_Specification_Action_Access; Control : in out AMF.Visitors.Traverse_Control) is null; not overriding procedure Visit_Variable (Self : in out UML_Iterator; Visitor : in out AMF.Visitors.Abstract_Visitor'Class; Element : not null AMF.UML.Variables.UML_Variable_Access; Control : in out AMF.Visitors.Traverse_Control) is null; end AMF.Visitors.UML_Iterators;
reznikmm/matreshka
Ada
3,799
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.Fo_Hyphenation_Remain_Char_Count_Attributes is pragma Preelaborate; type ODF_Fo_Hyphenation_Remain_Char_Count_Attribute is limited interface and XML.DOM.Attributes.DOM_Attribute; type ODF_Fo_Hyphenation_Remain_Char_Count_Attribute_Access is access all ODF_Fo_Hyphenation_Remain_Char_Count_Attribute'Class with Storage_Size => 0; end ODF.DOM.Fo_Hyphenation_Remain_Char_Count_Attributes;
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.Chart_Gap_Width_Attributes is pragma Preelaborate; type ODF_Chart_Gap_Width_Attribute is limited interface and XML.DOM.Attributes.DOM_Attribute; type ODF_Chart_Gap_Width_Attribute_Access is access all ODF_Chart_Gap_Width_Attribute'Class with Storage_Size => 0; end ODF.DOM.Chart_Gap_Width_Attributes;
reznikmm/matreshka
Ada
3,769
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_Text_Underline_Width_Attributes is pragma Preelaborate; type ODF_Style_Text_Underline_Width_Attribute is limited interface and XML.DOM.Attributes.DOM_Attribute; type ODF_Style_Text_Underline_Width_Attribute_Access is access all ODF_Style_Text_Underline_Width_Attribute'Class with Storage_Size => 0; end ODF.DOM.Style_Text_Underline_Width_Attributes;
reznikmm/matreshka
Ada
4,651
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.Visitors; with ODF.DOM.Draw_Page_Elements; package Matreshka.ODF_Draw.Page_Elements is type Draw_Page_Element_Node is new Matreshka.ODF_Draw.Abstract_Draw_Element_Node and ODF.DOM.Draw_Page_Elements.ODF_Draw_Page with null record; overriding function Create (Parameters : not null access Matreshka.DOM_Elements.Element_L2_Parameters) return Draw_Page_Element_Node; overriding function Get_Local_Name (Self : not null access constant Draw_Page_Element_Node) return League.Strings.Universal_String; overriding procedure Enter_Node (Self : not null access Draw_Page_Element_Node; Visitor : in out XML.DOM.Visitors.Abstract_Visitor'Class; Control : in out XML.DOM.Visitors.Traverse_Control); overriding procedure Leave_Node (Self : not null access Draw_Page_Element_Node; Visitor : in out XML.DOM.Visitors.Abstract_Visitor'Class; Control : in out XML.DOM.Visitors.Traverse_Control); overriding procedure Visit_Node (Self : not null access Draw_Page_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); end Matreshka.ODF_Draw.Page_Elements;
reznikmm/matreshka
Ada
6,365
adb
------------------------------------------------------------------------------ -- -- -- Matreshka Project -- -- -- -- Localization, Internationalization, Globalization for Ada -- -- -- -- 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$ ------------------------------------------------------------------------------ package body Matreshka.Internals.Strings.Handlers.X86_Utilities is use type Interfaces.Unsigned_32; function popcount (X : Interfaces.Unsigned_32) return Interfaces.Unsigned_32; pragma Import (Intrinsic, popcount, "__builtin_popcount"); ----------------------------------- -- Update_Index_Backward_Generic -- ----------------------------------- procedure Update_Index_Backward_Generic (Mask : Interfaces.Unsigned_32; Index : in out Positive) is begin if (Mask and 2#00000000_00000011#) = 0 then Index := Index - 1; end if; if (Mask and 2#00000000_00001100#) = 0 then Index := Index - 1; end if; if (Mask and 2#00000000_00110000#) = 0 then Index := Index - 1; end if; if (Mask and 2#00000000_11000000#) = 0 then Index := Index - 1; end if; if (Mask and 2#00000011_00000000#) = 0 then Index := Index - 1; end if; if (Mask and 2#00001100_00000000#) = 0 then Index := Index - 1; end if; if (Mask and 2#00110000_00000000#) = 0 then Index := Index - 1; end if; if (Mask and 2#11000000_00000000#) = 0 then Index := Index - 1; end if; end Update_Index_Backward_Generic; ---------------------------------- -- Update_Index_Backward_POPCNT -- ---------------------------------- procedure Update_Index_Backward_POPCNT (Mask : Interfaces.Unsigned_32; Index : in out Positive) is begin Index := Index - 8 + Integer (popcount (Mask) / 2); end Update_Index_Backward_POPCNT; ---------------------------------- -- Update_Index_Forward_Generic -- ---------------------------------- procedure Update_Index_Forward_Generic (Mask : Interfaces.Unsigned_32; Index : in out Positive) is begin if (Mask and 2#00000000_00000011#) = 0 then Index := Index + 1; end if; if (Mask and 2#00000000_00001100#) = 0 then Index := Index + 1; end if; if (Mask and 2#00000000_00110000#) = 0 then Index := Index + 1; end if; if (Mask and 2#00000000_11000000#) = 0 then Index := Index + 1; end if; if (Mask and 2#00000011_00000000#) = 0 then Index := Index + 1; end if; if (Mask and 2#00001100_00000000#) = 0 then Index := Index + 1; end if; if (Mask and 2#00110000_00000000#) = 0 then Index := Index + 1; end if; if (Mask and 2#11000000_00000000#) = 0 then Index := Index + 1; end if; end Update_Index_Forward_Generic; --------------------------------- -- Update_Index_Forward_POPCNT -- --------------------------------- procedure Update_Index_Forward_POPCNT (Mask : Interfaces.Unsigned_32; Index : in out Positive) is begin Index := Index + 8 - Integer (popcount (Mask) / 2); end Update_Index_Forward_POPCNT; end Matreshka.Internals.Strings.Handlers.X86_Utilities;
tum-ei-rcs/StratoX
Ada
3,606
ads
------------------------------------------------------------------------------ -- -- -- GNAT RUN-TIME LIBRARY (GNARL) COMPONENTS -- -- -- -- S Y S T E M . B B . P R O T E C T I O N -- -- -- -- S p e c -- -- -- -- Copyright (C) 1999-2002 Universidad Politecnica de Madrid -- -- Copyright (C) 2003-2004 The European Space Agency -- -- Copyright (C) 2003-2011, AdaCore -- -- -- -- GNARL is free software; you can redistribute it and/or modify it under -- -- terms of the GNU General Public License as published by the Free Soft- -- -- ware Foundation; either version 3, or (at your option) any later ver- -- -- sion. GNARL is distributed in the hope that it will be useful, but WITH- -- -- OUT ANY WARRANTY; without even the implied warranty of MERCHANTABILITY -- -- or FITNESS FOR A PARTICULAR PURPOSE. -- -- -- -- -- -- -- -- -- -- -- -- 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. -- -- -- -- The port of GNARL to bare board targets was initially developed by the -- -- Real-Time Systems Group at the Technical University of Madrid. -- -- -- ------------------------------------------------------------------------------ -- This package provides the functionality required to protect the data -- handled by the low level tasking system. pragma Restrictions (No_Elaboration_Code); package System.BB.Protection with SPARK_Mode => On is pragma Preelaborate; Wakeup_Served_Entry_Callback : access procedure := null; -- Callback set by upper layer procedure Enter_Kernel; pragma Inline (Enter_Kernel); -- This procedure is executed to signal the access to kernel data. Its use -- protect the consistence of the kernel. Interrupts are disabled while -- kernel data is being accessed. procedure Leave_Kernel; -- Leave_Kernel must be called when the access to kernel data finishes. -- Interrupts are enable to the appropriate level (according to the active -- priority of the running thread). end System.BB.Protection;
AdaCore/ada-traits-containers
Ada
2,035
ads
-- -- Copyright (C) 2015-2016, AdaCore -- -- SPDX-License-Identifier: Apache-2.0 WITH LLVM-exception -- -- Unbounded controlled vectors of unconstrained elements pragma Ada_2012; with Conts.Elements.Indefinite_SPARK; with Conts.Vectors.Generics; with Conts.Vectors.Storage.Unbounded; with Conts.Properties.SPARK; generic type Index_Type is (<>); type Element_Type (<>) is private; package Conts.Vectors.Indefinite_Unbounded_SPARK with SPARK_Mode is pragma Assertion_Policy (Pre => Suppressible, Ghost => Suppressible, Post => Ignore); package Elements is new Conts.Elements.Indefinite_SPARK (Element_Type, Pool => Conts.Global_Pool); package Storage is new Conts.Vectors.Storage.Unbounded (Elements => Elements.Traits, Container_Base_Type => Limited_Base, Resize_Policy => Conts.Vectors.Resize_1_5); package Vectors is new Conts.Vectors.Generics (Index_Type, Storage.Traits); subtype Vector is Vectors.Vector; subtype Cursor is Vectors.Cursor; subtype Constant_Returned is Elements.Traits.Constant_Returned; subtype Extended_Index is Vectors.Extended_Index; package Cursors renames Vectors.Cursors; package Maps renames Vectors.Maps; subtype Element_Sequence is Vectors.Impl.M.Sequence with Ghost; use type Element_Sequence; function Copy (Self : Vector'Class) return Vector'Class; -- Return a deep copy of Self procedure Swap (Self : in out Cursors.Forward.Container; Left, Right : Index_Type) renames Vectors.Swap; package Content_Models is new Conts.Properties.SPARK.Content_Models (Map_Type => Vectors.Base_Vector'Class, Element_Type => Element_Type, Model_Type => Element_Sequence, Index_Type => Vectors.Impl.M.Extended_Index, Model => Vectors.Impl.Model, Get => Vectors.Impl.M.Get, First => Vectors.Impl.M.First, Last => Vectors.Impl.M.Last); end Conts.Vectors.Indefinite_Unbounded_SPARK;
AdaCore/training_material
Ada
7,404
ads
pragma Ada_2005; pragma Style_Checks (Off); with Interfaces.C; use Interfaces.C; with Interfaces.C.Strings; with SDL_stdinc_h; limited with SDL_video_h; with SDL_pixels_h; limited with SDL_surface_h; package SDL_shape_h is SDL_NONSHAPEABLE_WINDOW : constant := -1; -- ..\SDL2_tmp\SDL_shape.h:42 SDL_INVALID_SHAPE_ARGUMENT : constant := -2; -- ..\SDL2_tmp\SDL_shape.h:43 SDL_WINDOW_LACKS_SHAPE : constant := -3; -- ..\SDL2_tmp\SDL_shape.h:44 -- arg-macro: function SDL_SHAPEMODEALPHA (mode) -- return mode = ShapeModeDefault or else mode = ShapeModeBinarizeAlpha or else mode = ShapeModeReverseBinarizeAlpha; -- Simple DirectMedia Layer -- Copyright (C) 1997-2018 Sam Lantinga <[email protected]> -- This software is provided 'as-is', without any express or implied -- warranty. In no event will the authors be held liable for any damages -- arising from the use of this software. -- Permission is granted to anyone to use this software for any purpose, -- including commercial applications, and to alter it and redistribute it -- freely, subject to the following restrictions: -- 1. The origin of this software must not be misrepresented; you must not -- claim that you wrote the original software. If you use this software -- in a product, an acknowledgment in the product documentation would be -- appreciated but is not required. -- 2. Altered source versions must be plainly marked as such, and must not be -- misrepresented as being the original software. -- 3. This notice may not be removed or altered from any source distribution. -- -- Set up for C function definitions, even when using C++ --* \file SDL_shape.h -- * -- * Header file for the shaped window API. -- --* -- * \brief Create a window that can be shaped with the specified position, dimensions, and flags. -- * -- * \param title The title of the window, in UTF-8 encoding. -- * \param x The x position of the window, ::SDL_WINDOWPOS_CENTERED, or -- * ::SDL_WINDOWPOS_UNDEFINED. -- * \param y The y position of the window, ::SDL_WINDOWPOS_CENTERED, or -- * ::SDL_WINDOWPOS_UNDEFINED. -- * \param w The width of the window. -- * \param h The height of the window. -- * \param flags The flags for the window, a mask of SDL_WINDOW_BORDERLESS with any of the following: -- * ::SDL_WINDOW_OPENGL, ::SDL_WINDOW_INPUT_GRABBED, -- * ::SDL_WINDOW_HIDDEN, ::SDL_WINDOW_RESIZABLE, -- * ::SDL_WINDOW_MAXIMIZED, ::SDL_WINDOW_MINIMIZED, -- * ::SDL_WINDOW_BORDERLESS is always set, and ::SDL_WINDOW_FULLSCREEN is always unset. -- * -- * \return The window created, or NULL if window creation failed. -- * -- * \sa SDL_DestroyWindow() -- function SDL_CreateShapedWindow (title : Interfaces.C.Strings.chars_ptr; x : unsigned; y : unsigned; w : unsigned; h : unsigned; flags : SDL_stdinc_h.Uint32) return access SDL_video_h.Class_SDL_Window.SDL_Window; -- ..\SDL2_tmp\SDL_shape.h:66 pragma Import (C, SDL_CreateShapedWindow, "SDL_CreateShapedWindow"); --* -- * \brief Return whether the given window is a shaped window. -- * -- * \param window The window to query for being shaped. -- * -- * \return SDL_TRUE if the window is a window that can be shaped, SDL_FALSE if the window is unshaped or NULL. -- * -- * \sa SDL_CreateShapedWindow -- function SDL_IsShapedWindow (window : access constant SDL_video_h.Class_SDL_Window.SDL_Window) return SDL_stdinc_h.SDL_bool; -- ..\SDL2_tmp\SDL_shape.h:77 pragma Import (C, SDL_IsShapedWindow, "SDL_IsShapedWindow"); --* \brief An enum denoting the specific type of contents present in an SDL_WindowShapeParams union. --* \brief The default mode, a binarized alpha cutoff of 1. --* \brief A binarized alpha cutoff with a given integer value. --* \brief A binarized alpha cutoff with a given integer value, but with the opposite comparison. --* \brief A color key is applied. type WindowShapeMode is (ShapeModeDefault, ShapeModeBinarizeAlpha, ShapeModeReverseBinarizeAlpha, ShapeModeColorKey); pragma Convention (C, WindowShapeMode); -- ..\SDL2_tmp\SDL_shape.h:89 --* \brief A union containing parameters for shaped windows. --* \brief A cutoff alpha value for binarization of the window shape's alpha channel. type SDL_WindowShapeParams (discr : unsigned := 0) is record case discr is when 0 => binarizationCutoff : aliased SDL_stdinc_h.Uint8; -- ..\SDL2_tmp\SDL_shape.h:96 when others => colorKey : aliased SDL_pixels_h.SDL_Color; -- ..\SDL2_tmp\SDL_shape.h:97 end case; end record; pragma Convention (C_Pass_By_Copy, SDL_WindowShapeParams); pragma Unchecked_Union (SDL_WindowShapeParams); -- ..\SDL2_tmp\SDL_shape.h:98 -- skipped anonymous struct anon_80 --* \brief A struct that tags the SDL_WindowShapeParams union with an enum describing the type of its contents. --* \brief The mode of these window-shape parameters. type SDL_WindowShapeMode is record mode : aliased WindowShapeMode; -- ..\SDL2_tmp\SDL_shape.h:103 parameters : aliased SDL_WindowShapeParams; -- ..\SDL2_tmp\SDL_shape.h:105 end record; pragma Convention (C_Pass_By_Copy, SDL_WindowShapeMode); -- ..\SDL2_tmp\SDL_shape.h:101 --* \brief Window-shape parameters. --* -- * \brief Set the shape and parameters of a shaped window. -- * -- * \param window The shaped window whose parameters should be set. -- * \param shape A surface encoding the desired shape for the window. -- * \param shape_mode The parameters to set for the shaped window. -- * -- * \return 0 on success, SDL_INVALID_SHAPE_ARGUMENT on an invalid shape argument, or SDL_NONSHAPEABLE_WINDOW -- * if the SDL_Window given does not reference a valid shaped window. -- * -- * \sa SDL_WindowShapeMode -- * \sa SDL_GetShapedWindowMode. -- function SDL_SetWindowShape (window : access SDL_video_h.Class_SDL_Window.SDL_Window; shape : access SDL_surface_h.SDL_Surface; shape_mode : access SDL_WindowShapeMode) return int; -- ..\SDL2_tmp\SDL_shape.h:121 pragma Import (C, SDL_SetWindowShape, "SDL_SetWindowShape"); --* -- * \brief Get the shape parameters of a shaped window. -- * -- * \param window The shaped window whose parameters should be retrieved. -- * \param shape_mode An empty shape-mode structure to fill, or NULL to check whether the window has a shape. -- * -- * \return 0 if the window has a shape and, provided shape_mode was not NULL, shape_mode has been filled with the mode -- * data, SDL_NONSHAPEABLE_WINDOW if the SDL_Window given is not a shaped window, or SDL_WINDOW_LACKS_SHAPE if -- * the SDL_Window given is a shapeable window currently lacking a shape. -- * -- * \sa SDL_WindowShapeMode -- * \sa SDL_SetWindowShape -- function SDL_GetShapedWindowMode (window : access SDL_video_h.Class_SDL_Window.SDL_Window; shape_mode : access SDL_WindowShapeMode) return int; -- ..\SDL2_tmp\SDL_shape.h:136 pragma Import (C, SDL_GetShapedWindowMode, "SDL_GetShapedWindowMode"); -- Ends C function definitions when using C++ end SDL_shape_h;
onox/orka
Ada
733
ads
-- SPDX-License-Identifier: Apache-2.0 -- -- Copyright (c) 2016 onox <[email protected]> -- -- Licensed under the Apache License, Version 2.0 (the "License"); -- you may not use this file except in compliance with the License. -- You may obtain a copy of the License at -- -- http://www.apache.org/licenses/LICENSE-2.0 -- -- Unless required by applicable law or agreed to in writing, software -- distributed under the License is distributed on an "AS IS" BASIS, -- WITHOUT WARRANTIES OR CONDITIONS OF ANY KIND, either express or implied. -- See the License for the specific language governing permissions and -- limitations under the License. package Orka.Scenes.Doubles is pragma Pure; end Orka.Scenes.Doubles;
zhmu/ananas
Ada
1,905
ads
------------------------------------------------------------------------------ -- -- -- GNAT RUN-TIME COMPONENTS -- -- -- -- A D A . T A S K _ T E R M I N A T I O N -- -- -- -- S p e c -- -- -- -- This specification is derived from the Ada Reference Manual for use with -- -- GNAT. In accordance with the copyright of that document, you can freely -- -- copy and modify this specification, provided that if you redistribute a -- -- modified version, any changes that you have made are clearly indicated. -- -- -- ------------------------------------------------------------------------------ with Ada.Task_Identification; with Ada.Exceptions; package Ada.Task_Termination is pragma Preelaborate (Task_Termination); type Cause_Of_Termination is (Normal, Abnormal, Unhandled_Exception); type Termination_Handler is access protected procedure (Cause : Cause_Of_Termination; T : Ada.Task_Identification.Task_Id; X : Ada.Exceptions.Exception_Occurrence); procedure Set_Dependents_Fallback_Handler (Handler : Termination_Handler); function Current_Task_Fallback_Handler return Termination_Handler; procedure Set_Specific_Handler (T : Ada.Task_Identification.Task_Id; Handler : Termination_Handler); function Specific_Handler (T : Ada.Task_Identification.Task_Id) return Termination_Handler; end Ada.Task_Termination;
reznikmm/matreshka
Ada
10,661
adb
------------------------------------------------------------------------------ -- -- -- Matreshka Project -- -- -- -- Ada Modeling Framework -- -- -- -- Runtime Library Component -- -- -- ------------------------------------------------------------------------------ -- -- -- Copyright © 2012, Vadim Godunko <[email protected]> -- -- All rights reserved. -- -- -- -- Redistribution and use in source and binary forms, with or without -- -- modification, are permitted provided that the following conditions -- -- are met: -- -- -- -- * Redistributions of source code must retain the above copyright -- -- notice, this list of conditions and the following disclaimer. -- -- -- -- * Redistributions in binary form must reproduce the above copyright -- -- notice, this list of conditions and the following disclaimer in the -- -- documentation and/or other materials provided with the distribution. -- -- -- -- * Neither the name of the Vadim Godunko, IE nor the names of its -- -- contributors may be used to endorse or promote products derived from -- -- this software without specific prior written permission. -- -- -- -- THIS SOFTWARE IS PROVIDED BY THE COPYRIGHT HOLDERS AND CONTRIBUTORS -- -- "AS IS" AND ANY EXPRESS OR IMPLIED WARRANTIES, INCLUDING, BUT NOT -- -- LIMITED TO, THE IMPLIED WARRANTIES OF MERCHANTABILITY AND FITNESS FOR -- -- A PARTICULAR PURPOSE ARE DISCLAIMED. IN NO EVENT SHALL THE COPYRIGHT -- -- HOLDER OR CONTRIBUTORS BE LIABLE FOR ANY DIRECT, INDIRECT, INCIDENTAL, -- -- SPECIAL, EXEMPLARY, OR CONSEQUENTIAL DAMAGES (INCLUDING, BUT NOT LIMITED -- -- TO, PROCUREMENT OF SUBSTITUTE GOODS OR SERVICES; LOSS OF USE, DATA, OR -- -- PROFITS; OR BUSINESS INTERRUPTION) HOWEVER CAUSED AND ON ANY THEORY OF -- -- LIABILITY, WHETHER IN CONTRACT, STRICT LIABILITY, OR TORT (INCLUDING -- -- NEGLIGENCE OR OTHERWISE) ARISING IN ANY WAY OUT OF THE USE OF THIS -- -- SOFTWARE, EVEN IF ADVISED OF THE POSSIBILITY OF SUCH DAMAGE. -- -- -- ------------------------------------------------------------------------------ -- $Revision$ $Date$ ------------------------------------------------------------------------------ -- This file is generated, don't edit it. ------------------------------------------------------------------------------ with AMF.DC; with AMF.DG.Clip_Paths; with AMF.DG.Groups; with AMF.DG.Styles.Collections; with AMF.Elements; with AMF.Internals.Element_Collections; with AMF.Internals.Helpers; with AMF.Internals.Tables.DD_Attributes; with AMF.Visitors.DG_Iterators; with AMF.Visitors.DG_Visitors; with League.Strings.Internals; package body AMF.Internals.DG_Images is ---------------- -- Get_Source -- ---------------- overriding function Get_Source (Self : not null access constant DG_Image_Proxy) return League.Strings.Universal_String is begin null; return League.Strings.Internals.Create (AMF.Internals.Tables.DD_Attributes.Internal_Get_Source (Self.Element)); end Get_Source; ---------------- -- Set_Source -- ---------------- overriding procedure Set_Source (Self : not null access DG_Image_Proxy; To : League.Strings.Universal_String) is begin AMF.Internals.Tables.DD_Attributes.Internal_Set_Source (Self.Element, League.Strings.Internals.Internal (To)); end Set_Source; ---------------- -- Get_Bounds -- ---------------- overriding function Get_Bounds (Self : not null access constant DG_Image_Proxy) return AMF.DC.DC_Bounds is begin return AMF.Internals.Tables.DD_Attributes.Internal_Get_Bounds (Self.Element); end Get_Bounds; ---------------- -- Set_Bounds -- ---------------- overriding procedure Set_Bounds (Self : not null access DG_Image_Proxy; To : AMF.DC.DC_Bounds) is begin AMF.Internals.Tables.DD_Attributes.Internal_Set_Bounds (Self.Element, To); end Set_Bounds; ----------------------------------- -- Get_Is_Aspect_Ratio_Preserved -- ----------------------------------- overriding function Get_Is_Aspect_Ratio_Preserved (Self : not null access constant DG_Image_Proxy) return Boolean is begin return AMF.Internals.Tables.DD_Attributes.Internal_Get_Is_Aspect_Ratio_Preserved (Self.Element); end Get_Is_Aspect_Ratio_Preserved; ----------------------------------- -- Set_Is_Aspect_Ratio_Preserved -- ----------------------------------- overriding procedure Set_Is_Aspect_Ratio_Preserved (Self : not null access DG_Image_Proxy; To : Boolean) is begin AMF.Internals.Tables.DD_Attributes.Internal_Set_Is_Aspect_Ratio_Preserved (Self.Element, To); end Set_Is_Aspect_Ratio_Preserved; --------------- -- Get_Group -- --------------- overriding function Get_Group (Self : not null access constant DG_Image_Proxy) return AMF.DG.Groups.DG_Group_Access is begin return AMF.DG.Groups.DG_Group_Access (AMF.Internals.Helpers.To_Element (AMF.Internals.Tables.DD_Attributes.Internal_Get_Group (Self.Element))); end Get_Group; --------------- -- Set_Group -- --------------- overriding procedure Set_Group (Self : not null access DG_Image_Proxy; To : AMF.DG.Groups.DG_Group_Access) is begin AMF.Internals.Tables.DD_Attributes.Internal_Set_Group (Self.Element, AMF.Internals.Helpers.To_Element (AMF.Elements.Element_Access (To))); end Set_Group; --------------------- -- Get_Local_Style -- --------------------- overriding function Get_Local_Style (Self : not null access constant DG_Image_Proxy) return AMF.DG.Styles.Collections.Ordered_Set_Of_DG_Style is begin return AMF.DG.Styles.Collections.Wrap (AMF.Internals.Element_Collections.Wrap (AMF.Internals.Tables.DD_Attributes.Internal_Get_Local_Style (Self.Element))); end Get_Local_Style; ---------------------- -- Get_Shared_Style -- ---------------------- overriding function Get_Shared_Style (Self : not null access constant DG_Image_Proxy) return AMF.DG.Styles.Collections.Ordered_Set_Of_DG_Style is begin return AMF.DG.Styles.Collections.Wrap (AMF.Internals.Element_Collections.Wrap (AMF.Internals.Tables.DD_Attributes.Internal_Get_Shared_Style (Self.Element))); end Get_Shared_Style; ------------------- -- Get_Transform -- ------------------- overriding function Get_Transform (Self : not null access constant DG_Image_Proxy) return AMF.DG.Sequence_Of_DG_Transform is begin return AMF.Internals.Tables.DD_Attributes.Internal_Get_Transform (Self.Element); end Get_Transform; ------------------- -- Get_Clip_Path -- ------------------- overriding function Get_Clip_Path (Self : not null access constant DG_Image_Proxy) return AMF.DG.Clip_Paths.DG_Clip_Path_Access is begin return AMF.DG.Clip_Paths.DG_Clip_Path_Access (AMF.Internals.Helpers.To_Element (AMF.Internals.Tables.DD_Attributes.Internal_Get_Clip_Path (Self.Element))); end Get_Clip_Path; ------------------- -- Set_Clip_Path -- ------------------- overriding procedure Set_Clip_Path (Self : not null access DG_Image_Proxy; To : AMF.DG.Clip_Paths.DG_Clip_Path_Access) is begin AMF.Internals.Tables.DD_Attributes.Internal_Set_Clip_Path (Self.Element, AMF.Internals.Helpers.To_Element (AMF.Elements.Element_Access (To))); end Set_Clip_Path; ------------------- -- Enter_Element -- ------------------- overriding procedure Enter_Element (Self : not null access constant DG_Image_Proxy; Visitor : in out AMF.Visitors.Abstract_Visitor'Class; Control : in out AMF.Visitors.Traverse_Control) is begin if Visitor in AMF.Visitors.DG_Visitors.DG_Visitor'Class then AMF.Visitors.DG_Visitors.DG_Visitor'Class (Visitor).Enter_Image (AMF.DG.Images.DG_Image_Access (Self), Control); end if; end Enter_Element; ------------------- -- Leave_Element -- ------------------- overriding procedure Leave_Element (Self : not null access constant DG_Image_Proxy; Visitor : in out AMF.Visitors.Abstract_Visitor'Class; Control : in out AMF.Visitors.Traverse_Control) is begin if Visitor in AMF.Visitors.DG_Visitors.DG_Visitor'Class then AMF.Visitors.DG_Visitors.DG_Visitor'Class (Visitor).Leave_Image (AMF.DG.Images.DG_Image_Access (Self), Control); end if; end Leave_Element; ------------------- -- Visit_Element -- ------------------- overriding procedure Visit_Element (Self : not null access constant DG_Image_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.DG_Iterators.DG_Iterator'Class then AMF.Visitors.DG_Iterators.DG_Iterator'Class (Iterator).Visit_Image (Visitor, AMF.DG.Images.DG_Image_Access (Self), Control); end if; end Visit_Element; end AMF.Internals.DG_Images;
mgrojo/bingada
Ada
609
adb
--***************************************************************************** --* --* PROJECT: BINGADA --* --* FILE: q_sound.null.adb --* --* AUTHOR: Manuel <mgrojo at github> --* --***************************************************************************** package body Q_Sound is --================================================================== -- Implementation for systems where sound is not currently supported. procedure P_Initialize is null; procedure P_Play_Number (V_Number : Positive) is null; procedure P_Clean_Up is null; end Q_Sound;
stcarrez/ada-util
Ada
960
ads
----------------------------------------------------------------------- -- util-texts -- Various Text Utilities -- Copyright (C) 2001, 2002, 2003, 2009, 2010, 2017 Stephane Carrez -- Written by Stephane Carrez ([email protected]) -- -- Licensed under the Apache License, Version 2.0 (the "License"); -- you may not use this file except in compliance with the License. -- You may obtain a copy of the License at -- -- http://www.apache.org/licenses/LICENSE-2.0 -- -- Unless required by applicable law or agreed to in writing, software -- distributed under the License is distributed on an "AS IS" BASIS, -- WITHOUT WARRANTIES OR CONDITIONS OF ANY KIND, either express or implied. -- See the License for the specific language governing permissions and -- limitations under the License. ----------------------------------------------------------------------- package Util.Texts is pragma Pure; end Util.Texts;
MinimSecure/unum-sdk
Ada
896
ads
-- Copyright 2018-2019 Free Software Foundation, Inc. -- -- This program is free software; you can redistribute it and/or modify -- it under the terms of the GNU General Public License as published by -- the Free Software Foundation; either version 3 of the License, or -- (at your option) any later version. -- -- This program is distributed in the hope that it will be useful, -- but WITHOUT ANY WARRANTY; without even the implied warranty of -- MERCHANTABILITY or FITNESS FOR A PARTICULAR PURPOSE. See the -- GNU General Public License for more details. -- -- You should have received a copy of the GNU General Public License -- along with this program. If not, see <http://www.gnu.org/licenses/>. package Ver is type Wrapper is record A : Integer; end record; u00045 : constant Wrapper := (A => 16#060287af#); pragma Export (C, u00045, "symada__cS"); end Ver;
ribasco/rpi-tools
Ada
228
ads
with System.Address_To_Access_Conversions; generic type T is new Root with private; package Array5_Pkg2.G is package Ptr is new System.Address_To_Access_Conversions (T); Data : Ptr.Object_Pointer; end Array5_Pkg2.G;
dilawar/ahir
Ada
134
adb
-- RUN: %llvmgcc -c %s procedure Array_Range_Ref is A : String (1 .. 3); B : String := A (A'RANGE)(1 .. 3); begin null; end;
Gabriel-Degret/adalib
Ada
1,476
ads
-- Standard Ada library specification -- Copyright (c) 2003-2018 Maxim Reznik <[email protected]> -- Copyright (c) 2004-2016 AXE Consultants -- Copyright (c) 2004, 2005, 2006 Ada-Europe -- Copyright (c) 2000 The MITRE Corporation, Inc. -- Copyright (c) 1992, 1993, 1994, 1995 Intermetrics, Inc. -- SPDX-License-Identifier: BSD-3-Clause and LicenseRef-AdaReferenceManual --------------------------------------------------------------------------- with Ada.Strings.Wide_Wide_Unbounded; package Ada.Wide_Wide_Text_IO.Wide_Wide_Unbounded_IO is procedure Put (File : in File_Type; Item : in Strings.Wide_Wide_Unbounded.Wide_Wide_Unbounded_String); procedure Put (Item : in Strings.Wide_Wide_Unbounded.Wide_Wide_Unbounded_String); procedure Put_Line (File : in File_Type; Item : in Strings.Wide_Wide_Unbounded.Wide_Wide_Unbounded_String); procedure Put_Line (Item : in Strings.Wide_Wide_Unbounded.Wide_Wide_Unbounded_String); function Get_Line (File : in File_Type) return Strings.Wide_Wide_Unbounded.Wide_Wide_Unbounded_String; function Get_Line return Strings.Wide_Wide_Unbounded.Wide_Wide_Unbounded_String; procedure Get_Line (File : in File_Type; Item : out Strings.Wide_Wide_Unbounded.Wide_Wide_Unbounded_String); procedure Get_Line (Item : out Strings.Wide_Wide_Unbounded.Wide_Wide_Unbounded_String); end Ada.Wide_Wide_Text_IO.Wide_Wide_Unbounded_IO;
redparavoz/ada-wiki
Ada
2,294
ads
----------------------------------------------------------------------- -- wiki-plugins -- Wiki plugins -- Copyright (C) 2016, 2018 Stephane Carrez -- Written by Stephane Carrez ([email protected]) -- -- Licensed under the Apache License, Version 2.0 (the "License"); -- you may not use this file except in compliance with the License. -- You may obtain a copy of the License at -- -- http://www.apache.org/licenses/LICENSE-2.0 -- -- Unless required by applicable law or agreed to in writing, software -- distributed under the License is distributed on an "AS IS" BASIS, -- WITHOUT WARRANTIES OR CONDITIONS OF ANY KIND, either express or implied. -- See the License for the specific language governing permissions and -- limitations under the License. ----------------------------------------------------------------------- with Wiki.Attributes; with Wiki.Documents; with Wiki.Filters; with Wiki.Strings; -- == Plugins == -- The <b>Wiki.Plugins</b> package defines the plugin interface that is used by the wiki -- engine to provide pluggable extensions in the Wiki. -- package Wiki.Plugins is pragma Preelaborate; type Plugin_Context; type Wiki_Plugin is limited interface; type Wiki_Plugin_Access is access all Wiki_Plugin'Class; type Plugin_Factory is limited interface; type Plugin_Factory_Access is access all Plugin_Factory'Class; -- Find a plugin knowing its name. function Find (Factory : in Plugin_Factory; Name : in String) return Wiki_Plugin_Access is abstract; type Plugin_Context is limited record Previous : access Plugin_Context; Filters : Wiki.Filters.Filter_Chain; Factory : Plugin_Factory_Access; Variables : Wiki.Attributes.Attribute_List; Syntax : Wiki.Wiki_Syntax; Ident : Wiki.Strings.UString; Is_Hidden : Boolean := False; Is_Included : Boolean := False; end record; -- Expand the plugin configured with the parameters for the document. procedure Expand (Plugin : in out Wiki_Plugin; Document : in out Wiki.Documents.Document; Params : in out Wiki.Attributes.Attribute_List; Context : in Plugin_Context) is abstract; end Wiki.Plugins;
wiremoons/AdbT
Ada
10,031
adb
------------------------------------------------------------------------------- -- Package : Manage_DB -- -- Description : Package to manage acronyms SQLite database file. -- -- Author : Simon Rowe <[email protected]> -- -- License : MIT Open Source. -- ------------------------------------------------------------------------------- -- -- Example SQLite Database access from Ada. Ada Gem: -- https://www.adacore.com/gems/gem-130-type-safe-database-api-part-2 -- -- Database table 'ACRONYMS' columns are: -- rowid|Acronym|Definition|Description|Source -- with Ada.Text_IO; use Ada.Text_IO; with Ada.Strings.Unbounded; use Ada.Strings.Unbounded; with GNATCOLL.SQL.Sqlite; with Ada.Directories; with Ada.Integer_Text_IO; -- use local packages with Locate_DB; with DB_File_Stats; package body Manage_Db is DB_Descr : GNATCOLL.SQL.Exec.Database_Description; DB : GNATCOLL.SQL.Exec.Database_Connection; Dbfile : Unbounded_String := Null_Unbounded_String; procedure Show_DB_Info is ----------------------------------------- -- Provide an overview of the database ----------------------------------------- begin -- locate and get handle to the database file if Locate_DB.Get_DB_Filename (Dbfile) then DB := (Set_SQLite_Handle (To_String (Dbfile))); else Put_Line (Standard_Error, "ERROR: no database file found. Exit."); New_Line (1); return; end if; if DB_Connected (DB) then Put ("Database file name: '"); Put (Ada.Directories.Simple_Name (To_String (Dbfile))); Put_Line ("'"); Put ("Database full path: '"); Put_Line (DB_File_Stats.Get_Full_Directory (To_String (Dbfile)) & "'"); Put ("Database file size: '"); Put_Line (DB_File_Stats.Get_File_Size (To_String (Dbfile)) & "' bytes"); Put ("Database modified: '"); Put_Line (DB_File_Stats.Get_File_Mod_Time (To_String (Dbfile)) & "'"); New_Line (1); Put_Line ("SQLite version: '" & Get_SQLite_Version (DB) & "'"); Put_Line ("Total acronyms: '" & Get_Total_DB_Records (DB) & "'"); Put_Line ("Last acronym entered: '" & Get_Last_Acronym (DB) & "'"); New_Line (1); else Put_Line (Standard_Error, "ERROR: no database file found or unable to connect. Exit."); -- Set_Exit_Status (Failure); -- failed as no database found return; end if; end Show_DB_Info; procedure Run_DB_Query (DB_Search_String : String) is ----------------------------------------- -- Run a search query on the database ----------------------------------------- -- Q : constant GNATCOLL.SQL.SQL_Query := -- GNATCOLL.SQL.SQL_Select ("Select * from Acronyms limit 5"); -- -- Q : constant String := "Select * from Acronyms limit 6"; -- -- Changed to use 'ifnull' to handle the return of any null database -- records to avoid crashes. The '?1' is the search param placeholder. Q : constant String := "Select rowid, ifnull(Acronym,''), " & "ifnull(Definition,''), " & "ifnull(Description,''), " & "ifnull(Source,'') " & "from Acronyms where Acronym like ?1 COLLATE NOCASE ORDER BY Source"; -- cursor that gets one row at a time R : GNATCOLL.SQL.Exec.Forward_Cursor; -- cursor that get all rows into memory immediately R : -- GNATCOLL.SQL.Exec.Direct_Cursor; begin -- locate and get handle to the database file if Locate_DB.Get_DB_Filename (Dbfile) then DB := (Set_SQLite_Handle (To_String (Dbfile))); else Put_Line (Standard_Error, "ERROR: no database file found to support search request. Exit."); return; end if; if DB_Connected (DB) then -- read query results into 'R' without parameter -- R.Fetch (Connection => DB, Query => Q); -- -- read query results into 'R' includes one parameter designated by -- the '+' for SQL_Parameter in GNATCOLL.SQL.Exec R.Fetch (Connection => DB, Query => Q, Params => (1 => +DB_Search_String)); if not Success (DB) then Put_Line (Standard_Error, "ERROR: search returned '" & Error (DB) & "'"); end if; while GNATCOLL.SQL.Exec.Has_Row (R) loop Put ("ID:"); Set_Col (15); Put_Line (GNATCOLL.SQL.Exec.Value (R, 0)); Put ("ACRONYM:"); Set_Col (15); Put ("'"); Put (GNATCOLL.SQL.Exec.Value (R, 1)); Put ("' is: '"); Put_Line (GNATCOLL.SQL.Exec.Value (R, 2) & "'."); Put ("DESCRIPTION:"); Set_Col (15); Put_Line (GNATCOLL.SQL.Exec.Value (R, 3)); Put ("SOURCE:"); Set_Col (15); Put ("'"); Put_Line (GNATCOLL.SQL.Exec.Value (R, 4) & "'."); New_Line (1); GNATCOLL.SQL.Exec.Next (R); end loop; else Put_Line (Standard_Error, "ERROR: database connection failed. Exit."); return; -- Set_Exit_Status (Failure); -- failed as no database found return; end if; -- check how many row were process in the loop above Put ("Search for '" & DB_Search_String & "' found '"); Ada.Integer_Text_IO.Put (Processed_Rows (R), Width => 0); Put_Line ("' records."); end Run_DB_Query; ----------------------------------------------------------------------- -- BELOW ARE PRIVATE ----------------------------------------------------------------------- function Set_SQLite_Handle (Dbfile : String) return Database_Connection is ----------------------------------------- -- Get a handle to the database file ----------------------------------------- begin -- create a database descriptor with the provided path and file name DB_Descr := GNATCOLL.SQL.Sqlite.Setup (Dbfile); -- get a task specific database connection: DB := -- GNATCOLL.SQL.Exec.Get_Task_Connection (DB_Descr); -- -- get a connection in non multi tasking app: DB := DB_Descr.Build_Connection; return DB; end Set_SQLite_Handle; function DB_Connected (DB : Database_Connection) return Boolean is ------------------------------------------------ -- Check for a connection to the database file ------------------------------------------------ begin if GNATCOLL.SQL.Exec.Check_Connection (DB) then return True; else Put_Line (Standard_Error, "ERROR: Connection to database failed."); return False; end if; end DB_Connected; function Get_SQLite_Version (DB : Database_Connection) return String is --------------------------------------------------- -- Get the SQLite version used with the database --------------------------------------------------- -- Get runtime SQLite version: sqlite3_libversion() The C version of -- call returns an 'Int' as per docs: -- https://www.sqlite.org/c3ref/libversion.html -- Q : constant String := "SELECT sqlite_version()"; R : GNATCOLL.SQL.Exec.Direct_Cursor; begin pragma Debug (Put_Line (Standard_Error, "[DEBUG] SQLite version check query: " & Q)); if DB_Connected (DB) then -- check DB is actual connection R.Fetch (Connection => DB, Query => Q); return GNATCOLL.SQL.Exec.Value (R, 0); -- output the use fetched query result as first value in 'R' else return "UNKNOWN"; -- no database connection - so version not known end if; end Get_SQLite_Version; function Get_Total_DB_Records (DB : Database_Connection) return String is ----------------------------------------------------- -- Get the total acronyms records in the database ----------------------------------------------------- -- Get runtime SQLite version: sqlite3_libversion() The C version of -- call returns an 'Int' as per docs: -- https://www.sqlite.org/c3ref/libversion.html -- -- printf "%,d" adds thousands separator Q : constant String := "select printf('%,d', count(*)) from ACRONYMS"; R : GNATCOLL.SQL.Exec.Direct_Cursor; begin pragma Debug (Put_Line (Standard_Error, "[DEBUG] Total records count query: " & Q)); if DB_Connected (DB) then -- check DB is actual connection R.Fetch (Connection => DB, Query => Q); return GNATCOLL.SQL.Exec.Value (R, 0); -- output the use fetched query result as first value in 'R' else return "UNKNOWN"; -- no database connection - so version not known end if; end Get_Total_DB_Records; function Get_Last_Acronym (DB : Database_Connection) return String is ----------------------------------------------------- -- Get the last acronym entered in the database ----------------------------------------------------- -- Get runtime SQLite version: sqlite3_libversion() The C version of -- call returns an 'Int' as per docs: -- https://www.sqlite.org/c3ref/libversion.html -- Q : constant String := "SELECT Acronym FROM acronyms Order by rowid DESC LIMIT 1"; R : GNATCOLL.SQL.Exec.Direct_Cursor; begin pragma Debug (Put_Line (Standard_Error, "[DEBUG] Last acronym entered query: " & Q)); if DB_Connected (DB) then -- check DB is actual connection R.Fetch (Connection => DB, Query => Q); return GNATCOLL.SQL.Exec.Value (R, 0); -- output the use fetched query result as first value in 'R' else return "UNKNOWN"; -- no database connection - so version not known end if; end Get_Last_Acronym; end Manage_Db;
stcarrez/stm32-ui
Ada
3,121
ads
----------------------------------------------------------------------- -- graphs-display -- Main display view manager for the graphs -- Copyright (C) 2018 Stephane Carrez -- Written by Stephane Carrez ([email protected]) -- -- Licensed under the Apache License, Version 2.0 (the "License"); -- you may not use this file except in compliance with the License. -- You may obtain a copy of the License at -- -- http://www.apache.org/licenses/LICENSE-2.0 -- -- Unless required by applicable law or agreed to in writing, software -- distributed under the License is distributed on an "AS IS" BASIS, -- WITHOUT WARRANTIES OR CONDITIONS OF ANY KIND, either express or implied. -- See the License for the specific language governing permissions and -- limitations under the License. ----------------------------------------------------------------------- with System; with HAL.Bitmap; with Ada.Real_Time; with UI.Buttons; with UI.Displays; with UI.Graphs; -- The graphs display manager displays a graph that shows more or less the CPU usage. -- An idle task is run at the lowest priority and it increments a counter during 100ms -- samples. Each 100ms, a percentage of CPU usage is computed from the counter. -- The computed value is absolutely not exact and gives a very rough estimate of the CPU usage. -- The CPU usage is a value in the range 0..100 which is then graphed by `UI.Graphs`. package Graphs.Display is -- Display refresh period. DISPLAY_TIME : constant Ada.Real_Time.Time_Span := Ada.Real_Time.Milliseconds (300); -- The graph rate: 1 new sample added each 100ms. GRAPH_RATE : constant Ada.Real_Time.Time_Span := Ada.Real_Time.Milliseconds (100); type Display_Type is limited new UI.Displays.Display_Type with private; -- Draw the layout presentation frame. overriding procedure On_Restore (Display : in out Display_Type; Buffer : in out HAL.Bitmap.Bitmap_Buffer'Class); -- Refresh the current display. overriding procedure On_Refresh (Display : in out Display_Type; Buffer : in out HAL.Bitmap.Bitmap_Buffer'Class; Deadline : out Ada.Real_Time.Time); -- Handle refresh timeout event. overriding procedure On_Timeout (Display : in out Display_Type; Buffer : in out HAL.Bitmap.Bitmap_Buffer'Class; Deadline : out Ada.Real_Time.Time); private type Graph_Value_Type is new Natural range 0 .. 100; package Int_Graph is new UI.Graphs (Value_Type => Graph_Value_Type, Graph_Size => 1000); subtype Graph_Type is Int_Graph.Graph_Type; Graph_Data : Int_Graph.Data_Type; task Idle_Task with Priority => System.Priority'First; type Display_Type is limited new UI.Displays.Display_Type with record Next_Button : UI.Buttons.Button_Type; Prev_Button : UI.Buttons.Button_Type; Graph : Graph_Type; Info_Button : UI.Buttons.Button_Type; Update : Ada.Real_Time.Time; Print_Info : Boolean := True; end record; end Graphs.Display;
AdaCore/training_material
Ada
37,068
ads
pragma Ada_2005; pragma Style_Checks (Off); with Interfaces.C; use Interfaces.C; with GL_gl_h; with System; package GL_glu_h is -- arg-macro: function gluErrorStringWIN (errCode) -- return (LPCWSTR) gluErrorString(errCode); GLU_VERSION_1_1 : constant := 1; -- c:\home\ochem\install\bin\../lib/gcc/i686-pc-mingw32/4.7.3/../../../../i686-pc-mingw32/include/GL/glu.h:111 GLU_VERSION_1_2 : constant := 1; -- c:\home\ochem\install\bin\../lib/gcc/i686-pc-mingw32/4.7.3/../../../../i686-pc-mingw32/include/GL/glu.h:112 GLU_INVALID_ENUM : constant := 100900; -- c:\home\ochem\install\bin\../lib/gcc/i686-pc-mingw32/4.7.3/../../../../i686-pc-mingw32/include/GL/glu.h:114 GLU_INVALID_VALUE : constant := 100901; -- c:\home\ochem\install\bin\../lib/gcc/i686-pc-mingw32/4.7.3/../../../../i686-pc-mingw32/include/GL/glu.h:115 GLU_OUT_OF_MEMORY : constant := 100902; -- c:\home\ochem\install\bin\../lib/gcc/i686-pc-mingw32/4.7.3/../../../../i686-pc-mingw32/include/GL/glu.h:116 GLU_INCOMPATIBLE_GL_VERSION : constant := 100903; -- c:\home\ochem\install\bin\../lib/gcc/i686-pc-mingw32/4.7.3/../../../../i686-pc-mingw32/include/GL/glu.h:117 GLU_VERSION : constant := 100800; -- c:\home\ochem\install\bin\../lib/gcc/i686-pc-mingw32/4.7.3/../../../../i686-pc-mingw32/include/GL/glu.h:119 GLU_EXTENSIONS : constant := 100801; -- c:\home\ochem\install\bin\../lib/gcc/i686-pc-mingw32/4.7.3/../../../../i686-pc-mingw32/include/GL/glu.h:120 -- unsupported macro: GLU_TRUE GL_TRUE -- unsupported macro: GLU_FALSE GL_FALSE GLU_SMOOTH : constant := 100000; -- c:\home\ochem\install\bin\../lib/gcc/i686-pc-mingw32/4.7.3/../../../../i686-pc-mingw32/include/GL/glu.h:125 GLU_FLAT : constant := 100001; -- c:\home\ochem\install\bin\../lib/gcc/i686-pc-mingw32/4.7.3/../../../../i686-pc-mingw32/include/GL/glu.h:126 GLU_NONE : constant := 100002; -- c:\home\ochem\install\bin\../lib/gcc/i686-pc-mingw32/4.7.3/../../../../i686-pc-mingw32/include/GL/glu.h:127 GLU_POINT : constant := 100010; -- c:\home\ochem\install\bin\../lib/gcc/i686-pc-mingw32/4.7.3/../../../../i686-pc-mingw32/include/GL/glu.h:129 GLU_LINE : constant := 100011; -- c:\home\ochem\install\bin\../lib/gcc/i686-pc-mingw32/4.7.3/../../../../i686-pc-mingw32/include/GL/glu.h:130 GLU_FILL : constant := 100012; -- c:\home\ochem\install\bin\../lib/gcc/i686-pc-mingw32/4.7.3/../../../../i686-pc-mingw32/include/GL/glu.h:131 GLU_SILHOUETTE : constant := 100013; -- c:\home\ochem\install\bin\../lib/gcc/i686-pc-mingw32/4.7.3/../../../../i686-pc-mingw32/include/GL/glu.h:132 GLU_OUTSIDE : constant := 100020; -- c:\home\ochem\install\bin\../lib/gcc/i686-pc-mingw32/4.7.3/../../../../i686-pc-mingw32/include/GL/glu.h:134 GLU_INSIDE : constant := 100021; -- c:\home\ochem\install\bin\../lib/gcc/i686-pc-mingw32/4.7.3/../../../../i686-pc-mingw32/include/GL/glu.h:135 GLU_TESS_MAX_COORD : constant := 1.0e150; -- c:\home\ochem\install\bin\../lib/gcc/i686-pc-mingw32/4.7.3/../../../../i686-pc-mingw32/include/GL/glu.h:137 GLU_TESS_WINDING_RULE : constant := 100140; -- c:\home\ochem\install\bin\../lib/gcc/i686-pc-mingw32/4.7.3/../../../../i686-pc-mingw32/include/GL/glu.h:139 GLU_TESS_BOUNDARY_ONLY : constant := 100141; -- c:\home\ochem\install\bin\../lib/gcc/i686-pc-mingw32/4.7.3/../../../../i686-pc-mingw32/include/GL/glu.h:140 GLU_TESS_TOLERANCE : constant := 100142; -- c:\home\ochem\install\bin\../lib/gcc/i686-pc-mingw32/4.7.3/../../../../i686-pc-mingw32/include/GL/glu.h:141 GLU_TESS_WINDING_ODD : constant := 100130; -- c:\home\ochem\install\bin\../lib/gcc/i686-pc-mingw32/4.7.3/../../../../i686-pc-mingw32/include/GL/glu.h:143 GLU_TESS_WINDING_NONZERO : constant := 100131; -- c:\home\ochem\install\bin\../lib/gcc/i686-pc-mingw32/4.7.3/../../../../i686-pc-mingw32/include/GL/glu.h:144 GLU_TESS_WINDING_POSITIVE : constant := 100132; -- c:\home\ochem\install\bin\../lib/gcc/i686-pc-mingw32/4.7.3/../../../../i686-pc-mingw32/include/GL/glu.h:145 GLU_TESS_WINDING_NEGATIVE : constant := 100133; -- c:\home\ochem\install\bin\../lib/gcc/i686-pc-mingw32/4.7.3/../../../../i686-pc-mingw32/include/GL/glu.h:146 GLU_TESS_WINDING_ABS_GEQ_TWO : constant := 100134; -- c:\home\ochem\install\bin\../lib/gcc/i686-pc-mingw32/4.7.3/../../../../i686-pc-mingw32/include/GL/glu.h:147 GLU_TESS_BEGIN : constant := 100100; -- c:\home\ochem\install\bin\../lib/gcc/i686-pc-mingw32/4.7.3/../../../../i686-pc-mingw32/include/GL/glu.h:149 GLU_TESS_VERTEX : constant := 100101; -- c:\home\ochem\install\bin\../lib/gcc/i686-pc-mingw32/4.7.3/../../../../i686-pc-mingw32/include/GL/glu.h:150 GLU_TESS_END : constant := 100102; -- c:\home\ochem\install\bin\../lib/gcc/i686-pc-mingw32/4.7.3/../../../../i686-pc-mingw32/include/GL/glu.h:151 GLU_TESS_ERROR : constant := 100103; -- c:\home\ochem\install\bin\../lib/gcc/i686-pc-mingw32/4.7.3/../../../../i686-pc-mingw32/include/GL/glu.h:152 GLU_TESS_EDGE_FLAG : constant := 100104; -- c:\home\ochem\install\bin\../lib/gcc/i686-pc-mingw32/4.7.3/../../../../i686-pc-mingw32/include/GL/glu.h:153 GLU_TESS_COMBINE : constant := 100105; -- c:\home\ochem\install\bin\../lib/gcc/i686-pc-mingw32/4.7.3/../../../../i686-pc-mingw32/include/GL/glu.h:154 GLU_TESS_BEGIN_DATA : constant := 100106; -- c:\home\ochem\install\bin\../lib/gcc/i686-pc-mingw32/4.7.3/../../../../i686-pc-mingw32/include/GL/glu.h:155 GLU_TESS_VERTEX_DATA : constant := 100107; -- c:\home\ochem\install\bin\../lib/gcc/i686-pc-mingw32/4.7.3/../../../../i686-pc-mingw32/include/GL/glu.h:156 GLU_TESS_END_DATA : constant := 100108; -- c:\home\ochem\install\bin\../lib/gcc/i686-pc-mingw32/4.7.3/../../../../i686-pc-mingw32/include/GL/glu.h:157 GLU_TESS_ERROR_DATA : constant := 100109; -- c:\home\ochem\install\bin\../lib/gcc/i686-pc-mingw32/4.7.3/../../../../i686-pc-mingw32/include/GL/glu.h:158 GLU_TESS_EDGE_FLAG_DATA : constant := 100110; -- c:\home\ochem\install\bin\../lib/gcc/i686-pc-mingw32/4.7.3/../../../../i686-pc-mingw32/include/GL/glu.h:159 GLU_TESS_COMBINE_DATA : constant := 100111; -- c:\home\ochem\install\bin\../lib/gcc/i686-pc-mingw32/4.7.3/../../../../i686-pc-mingw32/include/GL/glu.h:160 GLU_TESS_ERROR1 : constant := 100151; -- c:\home\ochem\install\bin\../lib/gcc/i686-pc-mingw32/4.7.3/../../../../i686-pc-mingw32/include/GL/glu.h:162 GLU_TESS_ERROR2 : constant := 100152; -- c:\home\ochem\install\bin\../lib/gcc/i686-pc-mingw32/4.7.3/../../../../i686-pc-mingw32/include/GL/glu.h:163 GLU_TESS_ERROR3 : constant := 100153; -- c:\home\ochem\install\bin\../lib/gcc/i686-pc-mingw32/4.7.3/../../../../i686-pc-mingw32/include/GL/glu.h:164 GLU_TESS_ERROR4 : constant := 100154; -- c:\home\ochem\install\bin\../lib/gcc/i686-pc-mingw32/4.7.3/../../../../i686-pc-mingw32/include/GL/glu.h:165 GLU_TESS_ERROR5 : constant := 100155; -- c:\home\ochem\install\bin\../lib/gcc/i686-pc-mingw32/4.7.3/../../../../i686-pc-mingw32/include/GL/glu.h:166 GLU_TESS_ERROR6 : constant := 100156; -- c:\home\ochem\install\bin\../lib/gcc/i686-pc-mingw32/4.7.3/../../../../i686-pc-mingw32/include/GL/glu.h:167 GLU_TESS_ERROR7 : constant := 100157; -- c:\home\ochem\install\bin\../lib/gcc/i686-pc-mingw32/4.7.3/../../../../i686-pc-mingw32/include/GL/glu.h:168 GLU_TESS_ERROR8 : constant := 100158; -- c:\home\ochem\install\bin\../lib/gcc/i686-pc-mingw32/4.7.3/../../../../i686-pc-mingw32/include/GL/glu.h:169 -- unsupported macro: GLU_TESS_MISSING_BEGIN_POLYGON GLU_TESS_ERROR1 -- unsupported macro: GLU_TESS_MISSING_BEGIN_CONTOUR GLU_TESS_ERROR2 -- unsupported macro: GLU_TESS_MISSING_END_POLYGON GLU_TESS_ERROR3 -- unsupported macro: GLU_TESS_MISSING_END_CONTOUR GLU_TESS_ERROR4 -- unsupported macro: GLU_TESS_COORD_TOO_LARGE GLU_TESS_ERROR5 -- unsupported macro: GLU_TESS_NEED_COMBINE_CALLBACK GLU_TESS_ERROR6 GLU_AUTO_LOAD_MATRIX : constant := 100200; -- c:\home\ochem\install\bin\../lib/gcc/i686-pc-mingw32/4.7.3/../../../../i686-pc-mingw32/include/GL/glu.h:178 GLU_CULLING : constant := 100201; -- c:\home\ochem\install\bin\../lib/gcc/i686-pc-mingw32/4.7.3/../../../../i686-pc-mingw32/include/GL/glu.h:179 GLU_SAMPLING_TOLERANCE : constant := 100203; -- c:\home\ochem\install\bin\../lib/gcc/i686-pc-mingw32/4.7.3/../../../../i686-pc-mingw32/include/GL/glu.h:180 GLU_DISPLAY_MODE : constant := 100204; -- c:\home\ochem\install\bin\../lib/gcc/i686-pc-mingw32/4.7.3/../../../../i686-pc-mingw32/include/GL/glu.h:181 GLU_PARAMETRIC_TOLERANCE : constant := 100202; -- c:\home\ochem\install\bin\../lib/gcc/i686-pc-mingw32/4.7.3/../../../../i686-pc-mingw32/include/GL/glu.h:182 GLU_SAMPLING_METHOD : constant := 100205; -- c:\home\ochem\install\bin\../lib/gcc/i686-pc-mingw32/4.7.3/../../../../i686-pc-mingw32/include/GL/glu.h:183 GLU_U_STEP : constant := 100206; -- c:\home\ochem\install\bin\../lib/gcc/i686-pc-mingw32/4.7.3/../../../../i686-pc-mingw32/include/GL/glu.h:184 GLU_V_STEP : constant := 100207; -- c:\home\ochem\install\bin\../lib/gcc/i686-pc-mingw32/4.7.3/../../../../i686-pc-mingw32/include/GL/glu.h:185 GLU_PATH_LENGTH : constant := 100215; -- c:\home\ochem\install\bin\../lib/gcc/i686-pc-mingw32/4.7.3/../../../../i686-pc-mingw32/include/GL/glu.h:187 GLU_PARAMETRIC_ERROR : constant := 100216; -- c:\home\ochem\install\bin\../lib/gcc/i686-pc-mingw32/4.7.3/../../../../i686-pc-mingw32/include/GL/glu.h:188 GLU_DOMAIN_DISTANCE : constant := 100217; -- c:\home\ochem\install\bin\../lib/gcc/i686-pc-mingw32/4.7.3/../../../../i686-pc-mingw32/include/GL/glu.h:189 GLU_MAP1_TRIM_2 : constant := 100210; -- c:\home\ochem\install\bin\../lib/gcc/i686-pc-mingw32/4.7.3/../../../../i686-pc-mingw32/include/GL/glu.h:191 GLU_MAP1_TRIM_3 : constant := 100211; -- c:\home\ochem\install\bin\../lib/gcc/i686-pc-mingw32/4.7.3/../../../../i686-pc-mingw32/include/GL/glu.h:192 GLU_OUTLINE_POLYGON : constant := 100240; -- c:\home\ochem\install\bin\../lib/gcc/i686-pc-mingw32/4.7.3/../../../../i686-pc-mingw32/include/GL/glu.h:194 GLU_OUTLINE_PATCH : constant := 100241; -- c:\home\ochem\install\bin\../lib/gcc/i686-pc-mingw32/4.7.3/../../../../i686-pc-mingw32/include/GL/glu.h:195 GLU_NURBS_ERROR1 : constant := 100251; -- c:\home\ochem\install\bin\../lib/gcc/i686-pc-mingw32/4.7.3/../../../../i686-pc-mingw32/include/GL/glu.h:197 GLU_NURBS_ERROR2 : constant := 100252; -- c:\home\ochem\install\bin\../lib/gcc/i686-pc-mingw32/4.7.3/../../../../i686-pc-mingw32/include/GL/glu.h:198 GLU_NURBS_ERROR3 : constant := 100253; -- c:\home\ochem\install\bin\../lib/gcc/i686-pc-mingw32/4.7.3/../../../../i686-pc-mingw32/include/GL/glu.h:199 GLU_NURBS_ERROR4 : constant := 100254; -- c:\home\ochem\install\bin\../lib/gcc/i686-pc-mingw32/4.7.3/../../../../i686-pc-mingw32/include/GL/glu.h:200 GLU_NURBS_ERROR5 : constant := 100255; -- c:\home\ochem\install\bin\../lib/gcc/i686-pc-mingw32/4.7.3/../../../../i686-pc-mingw32/include/GL/glu.h:201 GLU_NURBS_ERROR6 : constant := 100256; -- c:\home\ochem\install\bin\../lib/gcc/i686-pc-mingw32/4.7.3/../../../../i686-pc-mingw32/include/GL/glu.h:202 GLU_NURBS_ERROR7 : constant := 100257; -- c:\home\ochem\install\bin\../lib/gcc/i686-pc-mingw32/4.7.3/../../../../i686-pc-mingw32/include/GL/glu.h:203 GLU_NURBS_ERROR8 : constant := 100258; -- c:\home\ochem\install\bin\../lib/gcc/i686-pc-mingw32/4.7.3/../../../../i686-pc-mingw32/include/GL/glu.h:204 GLU_NURBS_ERROR9 : constant := 100259; -- c:\home\ochem\install\bin\../lib/gcc/i686-pc-mingw32/4.7.3/../../../../i686-pc-mingw32/include/GL/glu.h:205 GLU_NURBS_ERROR10 : constant := 100260; -- c:\home\ochem\install\bin\../lib/gcc/i686-pc-mingw32/4.7.3/../../../../i686-pc-mingw32/include/GL/glu.h:206 GLU_NURBS_ERROR11 : constant := 100261; -- c:\home\ochem\install\bin\../lib/gcc/i686-pc-mingw32/4.7.3/../../../../i686-pc-mingw32/include/GL/glu.h:207 GLU_NURBS_ERROR12 : constant := 100262; -- c:\home\ochem\install\bin\../lib/gcc/i686-pc-mingw32/4.7.3/../../../../i686-pc-mingw32/include/GL/glu.h:208 GLU_NURBS_ERROR13 : constant := 100263; -- c:\home\ochem\install\bin\../lib/gcc/i686-pc-mingw32/4.7.3/../../../../i686-pc-mingw32/include/GL/glu.h:209 GLU_NURBS_ERROR14 : constant := 100264; -- c:\home\ochem\install\bin\../lib/gcc/i686-pc-mingw32/4.7.3/../../../../i686-pc-mingw32/include/GL/glu.h:210 GLU_NURBS_ERROR15 : constant := 100265; -- c:\home\ochem\install\bin\../lib/gcc/i686-pc-mingw32/4.7.3/../../../../i686-pc-mingw32/include/GL/glu.h:211 GLU_NURBS_ERROR16 : constant := 100266; -- c:\home\ochem\install\bin\../lib/gcc/i686-pc-mingw32/4.7.3/../../../../i686-pc-mingw32/include/GL/glu.h:212 GLU_NURBS_ERROR17 : constant := 100267; -- c:\home\ochem\install\bin\../lib/gcc/i686-pc-mingw32/4.7.3/../../../../i686-pc-mingw32/include/GL/glu.h:213 GLU_NURBS_ERROR18 : constant := 100268; -- c:\home\ochem\install\bin\../lib/gcc/i686-pc-mingw32/4.7.3/../../../../i686-pc-mingw32/include/GL/glu.h:214 GLU_NURBS_ERROR19 : constant := 100269; -- c:\home\ochem\install\bin\../lib/gcc/i686-pc-mingw32/4.7.3/../../../../i686-pc-mingw32/include/GL/glu.h:215 GLU_NURBS_ERROR20 : constant := 100270; -- c:\home\ochem\install\bin\../lib/gcc/i686-pc-mingw32/4.7.3/../../../../i686-pc-mingw32/include/GL/glu.h:216 GLU_NURBS_ERROR21 : constant := 100271; -- c:\home\ochem\install\bin\../lib/gcc/i686-pc-mingw32/4.7.3/../../../../i686-pc-mingw32/include/GL/glu.h:217 GLU_NURBS_ERROR22 : constant := 100272; -- c:\home\ochem\install\bin\../lib/gcc/i686-pc-mingw32/4.7.3/../../../../i686-pc-mingw32/include/GL/glu.h:218 GLU_NURBS_ERROR23 : constant := 100273; -- c:\home\ochem\install\bin\../lib/gcc/i686-pc-mingw32/4.7.3/../../../../i686-pc-mingw32/include/GL/glu.h:219 GLU_NURBS_ERROR24 : constant := 100274; -- c:\home\ochem\install\bin\../lib/gcc/i686-pc-mingw32/4.7.3/../../../../i686-pc-mingw32/include/GL/glu.h:220 GLU_NURBS_ERROR25 : constant := 100275; -- c:\home\ochem\install\bin\../lib/gcc/i686-pc-mingw32/4.7.3/../../../../i686-pc-mingw32/include/GL/glu.h:221 GLU_NURBS_ERROR26 : constant := 100276; -- c:\home\ochem\install\bin\../lib/gcc/i686-pc-mingw32/4.7.3/../../../../i686-pc-mingw32/include/GL/glu.h:222 GLU_NURBS_ERROR27 : constant := 100277; -- c:\home\ochem\install\bin\../lib/gcc/i686-pc-mingw32/4.7.3/../../../../i686-pc-mingw32/include/GL/glu.h:223 GLU_NURBS_ERROR28 : constant := 100278; -- c:\home\ochem\install\bin\../lib/gcc/i686-pc-mingw32/4.7.3/../../../../i686-pc-mingw32/include/GL/glu.h:224 GLU_NURBS_ERROR29 : constant := 100279; -- c:\home\ochem\install\bin\../lib/gcc/i686-pc-mingw32/4.7.3/../../../../i686-pc-mingw32/include/GL/glu.h:225 GLU_NURBS_ERROR30 : constant := 100280; -- c:\home\ochem\install\bin\../lib/gcc/i686-pc-mingw32/4.7.3/../../../../i686-pc-mingw32/include/GL/glu.h:226 GLU_NURBS_ERROR31 : constant := 100281; -- c:\home\ochem\install\bin\../lib/gcc/i686-pc-mingw32/4.7.3/../../../../i686-pc-mingw32/include/GL/glu.h:227 GLU_NURBS_ERROR32 : constant := 100282; -- c:\home\ochem\install\bin\../lib/gcc/i686-pc-mingw32/4.7.3/../../../../i686-pc-mingw32/include/GL/glu.h:228 GLU_NURBS_ERROR33 : constant := 100283; -- c:\home\ochem\install\bin\../lib/gcc/i686-pc-mingw32/4.7.3/../../../../i686-pc-mingw32/include/GL/glu.h:229 GLU_NURBS_ERROR34 : constant := 100284; -- c:\home\ochem\install\bin\../lib/gcc/i686-pc-mingw32/4.7.3/../../../../i686-pc-mingw32/include/GL/glu.h:230 GLU_NURBS_ERROR35 : constant := 100285; -- c:\home\ochem\install\bin\../lib/gcc/i686-pc-mingw32/4.7.3/../../../../i686-pc-mingw32/include/GL/glu.h:231 GLU_NURBS_ERROR36 : constant := 100286; -- c:\home\ochem\install\bin\../lib/gcc/i686-pc-mingw32/4.7.3/../../../../i686-pc-mingw32/include/GL/glu.h:232 GLU_NURBS_ERROR37 : constant := 100287; -- c:\home\ochem\install\bin\../lib/gcc/i686-pc-mingw32/4.7.3/../../../../i686-pc-mingw32/include/GL/glu.h:233 GLU_CW : constant := 100120; -- c:\home\ochem\install\bin\../lib/gcc/i686-pc-mingw32/4.7.3/../../../../i686-pc-mingw32/include/GL/glu.h:239 GLU_CCW : constant := 100121; -- c:\home\ochem\install\bin\../lib/gcc/i686-pc-mingw32/4.7.3/../../../../i686-pc-mingw32/include/GL/glu.h:240 GLU_INTERIOR : constant := 100122; -- c:\home\ochem\install\bin\../lib/gcc/i686-pc-mingw32/4.7.3/../../../../i686-pc-mingw32/include/GL/glu.h:241 GLU_EXTERIOR : constant := 100123; -- c:\home\ochem\install\bin\../lib/gcc/i686-pc-mingw32/4.7.3/../../../../i686-pc-mingw32/include/GL/glu.h:242 GLU_UNKNOWN : constant := 100124; -- c:\home\ochem\install\bin\../lib/gcc/i686-pc-mingw32/4.7.3/../../../../i686-pc-mingw32/include/GL/glu.h:243 -- unsupported macro: GLU_BEGIN GLU_TESS_BEGIN -- unsupported macro: GLU_VERTEX GLU_TESS_VERTEX -- unsupported macro: GLU_END GLU_TESS_END -- unsupported macro: GLU_ERROR GLU_TESS_ERROR -- unsupported macro: GLU_EDGE_FLAG GLU_TESS_EDGE_FLAG function gluErrorString (errCode : GL_gl_h.GLenum) return access GL_gl_h.GLubyte; -- c:\home\ochem\install\bin\../lib/gcc/i686-pc-mingw32/4.7.3/../../../../i686-pc-mingw32/include/GL/glu.h:24 pragma Import (Stdcall, gluErrorString, "gluErrorString"); function gluErrorUnicodeStringEXT (errCode : GL_gl_h.GLenum) return access wchar_t; -- c:\home\ochem\install\bin\../lib/gcc/i686-pc-mingw32/4.7.3/../../../../i686-pc-mingw32/include/GL/glu.h:25 pragma Import (Stdcall, gluErrorUnicodeStringEXT, "gluErrorUnicodeStringEXT"); function gluGetString (name : GL_gl_h.GLenum) return access GL_gl_h.GLubyte; -- c:\home\ochem\install\bin\../lib/gcc/i686-pc-mingw32/4.7.3/../../../../i686-pc-mingw32/include/GL/glu.h:26 pragma Import (Stdcall, gluGetString, "gluGetString"); procedure gluOrtho2D (left : GL_gl_h.GLdouble; right : GL_gl_h.GLdouble; bottom : GL_gl_h.GLdouble; top : GL_gl_h.GLdouble); -- c:\home\ochem\install\bin\../lib/gcc/i686-pc-mingw32/4.7.3/../../../../i686-pc-mingw32/include/GL/glu.h:27 pragma Import (Stdcall, gluOrtho2D, "gluOrtho2D"); procedure gluPerspective (fovy : GL_gl_h.GLdouble; aspect : GL_gl_h.GLdouble; zNear : GL_gl_h.GLdouble; zFar : GL_gl_h.GLdouble); -- c:\home\ochem\install\bin\../lib/gcc/i686-pc-mingw32/4.7.3/../../../../i686-pc-mingw32/include/GL/glu.h:28 pragma Import (Stdcall, gluPerspective, "gluPerspective"); procedure gluPickMatrix (x : GL_gl_h.GLdouble; y : GL_gl_h.GLdouble; width : GL_gl_h.GLdouble; height : GL_gl_h.GLdouble; viewport : access GL_gl_h.GLint); -- c:\home\ochem\install\bin\../lib/gcc/i686-pc-mingw32/4.7.3/../../../../i686-pc-mingw32/include/GL/glu.h:29 pragma Import (Stdcall, gluPickMatrix, "gluPickMatrix"); procedure gluLookAt (eyex : GL_gl_h.GLdouble; eyey : GL_gl_h.GLdouble; eyez : GL_gl_h.GLdouble; centerx : GL_gl_h.GLdouble; centery : GL_gl_h.GLdouble; centerz : GL_gl_h.GLdouble; upx : GL_gl_h.GLdouble; upy : GL_gl_h.GLdouble; upz : GL_gl_h.GLdouble); -- c:\home\ochem\install\bin\../lib/gcc/i686-pc-mingw32/4.7.3/../../../../i686-pc-mingw32/include/GL/glu.h:30 pragma Import (Stdcall, gluLookAt, "gluLookAt"); function gluProject (objx : GL_gl_h.GLdouble; objy : GL_gl_h.GLdouble; objz : GL_gl_h.GLdouble; modelMatrix : access GL_gl_h.GLdouble; projMatrix : access GL_gl_h.GLdouble; viewport : access GL_gl_h.GLint; winx : access GL_gl_h.GLdouble; winy : access GL_gl_h.GLdouble; winz : access GL_gl_h.GLdouble) return int; -- c:\home\ochem\install\bin\../lib/gcc/i686-pc-mingw32/4.7.3/../../../../i686-pc-mingw32/include/GL/glu.h:31 pragma Import (Stdcall, gluProject, "gluProject"); function gluUnProject (winx : GL_gl_h.GLdouble; winy : GL_gl_h.GLdouble; winz : GL_gl_h.GLdouble; modelMatrix : access GL_gl_h.GLdouble; projMatrix : access GL_gl_h.GLdouble; viewport : access GL_gl_h.GLint; objx : access GL_gl_h.GLdouble; objy : access GL_gl_h.GLdouble; objz : access GL_gl_h.GLdouble) return int; -- c:\home\ochem\install\bin\../lib/gcc/i686-pc-mingw32/4.7.3/../../../../i686-pc-mingw32/include/GL/glu.h:32 pragma Import (Stdcall, gluUnProject, "gluUnProject"); function gluScaleImage (format : GL_gl_h.GLenum; widthin : GL_gl_h.GLint; heightin : GL_gl_h.GLint; typein : GL_gl_h.GLenum; datain : System.Address; widthout : GL_gl_h.GLint; heightout : GL_gl_h.GLint; typeout : GL_gl_h.GLenum; dataout : System.Address) return int; -- c:\home\ochem\install\bin\../lib/gcc/i686-pc-mingw32/4.7.3/../../../../i686-pc-mingw32/include/GL/glu.h:33 pragma Import (Stdcall, gluScaleImage, "gluScaleImage"); function gluBuild1DMipmaps (target : GL_gl_h.GLenum; components : GL_gl_h.GLint; width : GL_gl_h.GLint; format : GL_gl_h.GLenum; c_type : GL_gl_h.GLenum; data : System.Address) return int; -- c:\home\ochem\install\bin\../lib/gcc/i686-pc-mingw32/4.7.3/../../../../i686-pc-mingw32/include/GL/glu.h:34 pragma Import (Stdcall, gluBuild1DMipmaps, "gluBuild1DMipmaps"); function gluBuild2DMipmaps (target : GL_gl_h.GLenum; components : GL_gl_h.GLint; width : GL_gl_h.GLint; height : GL_gl_h.GLint; format : GL_gl_h.GLenum; c_type : GL_gl_h.GLenum; data : System.Address) return int; -- c:\home\ochem\install\bin\../lib/gcc/i686-pc-mingw32/4.7.3/../../../../i686-pc-mingw32/include/GL/glu.h:35 pragma Import (Stdcall, gluBuild2DMipmaps, "gluBuild2DMipmaps"); -- skipped empty struct GLUnurbs -- skipped empty struct GLUquadric -- skipped empty struct GLUtesselator -- skipped empty struct GLUnurbsObj -- skipped empty struct GLUquadricObj -- skipped empty struct GLUtesselatorObj -- skipped empty struct GLUtriangulatorObj function gluNewQuadric return System.Address; -- c:\home\ochem\install\bin\../lib/gcc/i686-pc-mingw32/4.7.3/../../../../i686-pc-mingw32/include/GL/glu.h:58 pragma Import (Stdcall, gluNewQuadric, "gluNewQuadric"); procedure gluDeleteQuadric (state : System.Address); -- c:\home\ochem\install\bin\../lib/gcc/i686-pc-mingw32/4.7.3/../../../../i686-pc-mingw32/include/GL/glu.h:59 pragma Import (Stdcall, gluDeleteQuadric, "gluDeleteQuadric"); procedure gluQuadricNormals (quadObject : System.Address; normals : GL_gl_h.GLenum); -- c:\home\ochem\install\bin\../lib/gcc/i686-pc-mingw32/4.7.3/../../../../i686-pc-mingw32/include/GL/glu.h:60 pragma Import (Stdcall, gluQuadricNormals, "gluQuadricNormals"); procedure gluQuadricTexture (quadObject : System.Address; textureCoords : GL_gl_h.GLboolean); -- c:\home\ochem\install\bin\../lib/gcc/i686-pc-mingw32/4.7.3/../../../../i686-pc-mingw32/include/GL/glu.h:61 pragma Import (Stdcall, gluQuadricTexture, "gluQuadricTexture"); procedure gluQuadricOrientation (quadObject : System.Address; orientation : GL_gl_h.GLenum); -- c:\home\ochem\install\bin\../lib/gcc/i686-pc-mingw32/4.7.3/../../../../i686-pc-mingw32/include/GL/glu.h:62 pragma Import (Stdcall, gluQuadricOrientation, "gluQuadricOrientation"); procedure gluQuadricDrawStyle (quadObject : System.Address; drawStyle : GL_gl_h.GLenum); -- c:\home\ochem\install\bin\../lib/gcc/i686-pc-mingw32/4.7.3/../../../../i686-pc-mingw32/include/GL/glu.h:63 pragma Import (Stdcall, gluQuadricDrawStyle, "gluQuadricDrawStyle"); procedure gluCylinder (qobj : System.Address; baseRadius : GL_gl_h.GLdouble; topRadius : GL_gl_h.GLdouble; height : GL_gl_h.GLdouble; slices : GL_gl_h.GLint; stacks : GL_gl_h.GLint); -- c:\home\ochem\install\bin\../lib/gcc/i686-pc-mingw32/4.7.3/../../../../i686-pc-mingw32/include/GL/glu.h:64 pragma Import (Stdcall, gluCylinder, "gluCylinder"); procedure gluDisk (qobj : System.Address; innerRadius : GL_gl_h.GLdouble; outerRadius : GL_gl_h.GLdouble; slices : GL_gl_h.GLint; loops : GL_gl_h.GLint); -- c:\home\ochem\install\bin\../lib/gcc/i686-pc-mingw32/4.7.3/../../../../i686-pc-mingw32/include/GL/glu.h:65 pragma Import (Stdcall, gluDisk, "gluDisk"); procedure gluPartialDisk (qobj : System.Address; innerRadius : GL_gl_h.GLdouble; outerRadius : GL_gl_h.GLdouble; slices : GL_gl_h.GLint; loops : GL_gl_h.GLint; startAngle : GL_gl_h.GLdouble; sweepAngle : GL_gl_h.GLdouble); -- c:\home\ochem\install\bin\../lib/gcc/i686-pc-mingw32/4.7.3/../../../../i686-pc-mingw32/include/GL/glu.h:66 pragma Import (Stdcall, gluPartialDisk, "gluPartialDisk"); procedure gluSphere (qobj : System.Address; radius : GL_gl_h.GLdouble; slices : GL_gl_h.GLint; stacks : GL_gl_h.GLint); -- c:\home\ochem\install\bin\../lib/gcc/i686-pc-mingw32/4.7.3/../../../../i686-pc-mingw32/include/GL/glu.h:67 pragma Import (Stdcall, gluSphere, "gluSphere"); procedure gluQuadricCallback (qobj : System.Address; which : GL_gl_h.GLenum; fn : access procedure); -- c:\home\ochem\install\bin\../lib/gcc/i686-pc-mingw32/4.7.3/../../../../i686-pc-mingw32/include/GL/glu.h:68 pragma Import (Stdcall, gluQuadricCallback, "gluQuadricCallback"); function gluNewTess return System.Address; -- c:\home\ochem\install\bin\../lib/gcc/i686-pc-mingw32/4.7.3/../../../../i686-pc-mingw32/include/GL/glu.h:69 pragma Import (Stdcall, gluNewTess, "gluNewTess"); procedure gluDeleteTess (tess : System.Address); -- c:\home\ochem\install\bin\../lib/gcc/i686-pc-mingw32/4.7.3/../../../../i686-pc-mingw32/include/GL/glu.h:70 pragma Import (Stdcall, gluDeleteTess, "gluDeleteTess"); procedure gluTessBeginPolygon (tess : System.Address; polygon_data : System.Address); -- c:\home\ochem\install\bin\../lib/gcc/i686-pc-mingw32/4.7.3/../../../../i686-pc-mingw32/include/GL/glu.h:71 pragma Import (Stdcall, gluTessBeginPolygon, "gluTessBeginPolygon"); procedure gluTessBeginContour (tess : System.Address); -- c:\home\ochem\install\bin\../lib/gcc/i686-pc-mingw32/4.7.3/../../../../i686-pc-mingw32/include/GL/glu.h:72 pragma Import (Stdcall, gluTessBeginContour, "gluTessBeginContour"); procedure gluTessVertex (tess : System.Address; coords : access GL_gl_h.GLdouble; data : System.Address); -- c:\home\ochem\install\bin\../lib/gcc/i686-pc-mingw32/4.7.3/../../../../i686-pc-mingw32/include/GL/glu.h:73 pragma Import (Stdcall, gluTessVertex, "gluTessVertex"); procedure gluTessEndContour (tess : System.Address); -- c:\home\ochem\install\bin\../lib/gcc/i686-pc-mingw32/4.7.3/../../../../i686-pc-mingw32/include/GL/glu.h:74 pragma Import (Stdcall, gluTessEndContour, "gluTessEndContour"); procedure gluTessEndPolygon (tess : System.Address); -- c:\home\ochem\install\bin\../lib/gcc/i686-pc-mingw32/4.7.3/../../../../i686-pc-mingw32/include/GL/glu.h:75 pragma Import (Stdcall, gluTessEndPolygon, "gluTessEndPolygon"); procedure gluTessProperty (tess : System.Address; which : GL_gl_h.GLenum; value : GL_gl_h.GLdouble); -- c:\home\ochem\install\bin\../lib/gcc/i686-pc-mingw32/4.7.3/../../../../i686-pc-mingw32/include/GL/glu.h:76 pragma Import (Stdcall, gluTessProperty, "gluTessProperty"); procedure gluTessNormal (tess : System.Address; x : GL_gl_h.GLdouble; y : GL_gl_h.GLdouble; z : GL_gl_h.GLdouble); -- c:\home\ochem\install\bin\../lib/gcc/i686-pc-mingw32/4.7.3/../../../../i686-pc-mingw32/include/GL/glu.h:77 pragma Import (Stdcall, gluTessNormal, "gluTessNormal"); procedure gluTessCallback (tess : System.Address; which : GL_gl_h.GLenum; fn : access procedure); -- c:\home\ochem\install\bin\../lib/gcc/i686-pc-mingw32/4.7.3/../../../../i686-pc-mingw32/include/GL/glu.h:78 pragma Import (Stdcall, gluTessCallback, "gluTessCallback"); procedure gluGetTessProperty (tess : System.Address; which : GL_gl_h.GLenum; value : access GL_gl_h.GLdouble); -- c:\home\ochem\install\bin\../lib/gcc/i686-pc-mingw32/4.7.3/../../../../i686-pc-mingw32/include/GL/glu.h:79 pragma Import (Stdcall, gluGetTessProperty, "gluGetTessProperty"); function gluNewNurbsRenderer return System.Address; -- c:\home\ochem\install\bin\../lib/gcc/i686-pc-mingw32/4.7.3/../../../../i686-pc-mingw32/include/GL/glu.h:80 pragma Import (Stdcall, gluNewNurbsRenderer, "gluNewNurbsRenderer"); procedure gluDeleteNurbsRenderer (nobj : System.Address); -- c:\home\ochem\install\bin\../lib/gcc/i686-pc-mingw32/4.7.3/../../../../i686-pc-mingw32/include/GL/glu.h:81 pragma Import (Stdcall, gluDeleteNurbsRenderer, "gluDeleteNurbsRenderer"); procedure gluBeginSurface (nobj : System.Address); -- c:\home\ochem\install\bin\../lib/gcc/i686-pc-mingw32/4.7.3/../../../../i686-pc-mingw32/include/GL/glu.h:82 pragma Import (Stdcall, gluBeginSurface, "gluBeginSurface"); procedure gluBeginCurve (nobj : System.Address); -- c:\home\ochem\install\bin\../lib/gcc/i686-pc-mingw32/4.7.3/../../../../i686-pc-mingw32/include/GL/glu.h:83 pragma Import (Stdcall, gluBeginCurve, "gluBeginCurve"); procedure gluEndCurve (nobj : System.Address); -- c:\home\ochem\install\bin\../lib/gcc/i686-pc-mingw32/4.7.3/../../../../i686-pc-mingw32/include/GL/glu.h:84 pragma Import (Stdcall, gluEndCurve, "gluEndCurve"); procedure gluEndSurface (nobj : System.Address); -- c:\home\ochem\install\bin\../lib/gcc/i686-pc-mingw32/4.7.3/../../../../i686-pc-mingw32/include/GL/glu.h:85 pragma Import (Stdcall, gluEndSurface, "gluEndSurface"); procedure gluBeginTrim (nobj : System.Address); -- c:\home\ochem\install\bin\../lib/gcc/i686-pc-mingw32/4.7.3/../../../../i686-pc-mingw32/include/GL/glu.h:86 pragma Import (Stdcall, gluBeginTrim, "gluBeginTrim"); procedure gluEndTrim (nobj : System.Address); -- c:\home\ochem\install\bin\../lib/gcc/i686-pc-mingw32/4.7.3/../../../../i686-pc-mingw32/include/GL/glu.h:87 pragma Import (Stdcall, gluEndTrim, "gluEndTrim"); procedure gluPwlCurve (nobj : System.Address; count : GL_gl_h.GLint; c_array : access GL_gl_h.GLfloat; stride : GL_gl_h.GLint; c_type : GL_gl_h.GLenum); -- c:\home\ochem\install\bin\../lib/gcc/i686-pc-mingw32/4.7.3/../../../../i686-pc-mingw32/include/GL/glu.h:88 pragma Import (Stdcall, gluPwlCurve, "gluPwlCurve"); procedure gluNurbsCurve (nobj : System.Address; nknots : GL_gl_h.GLint; knot : access GL_gl_h.GLfloat; stride : GL_gl_h.GLint; ctlarray : access GL_gl_h.GLfloat; order : GL_gl_h.GLint; c_type : GL_gl_h.GLenum); -- c:\home\ochem\install\bin\../lib/gcc/i686-pc-mingw32/4.7.3/../../../../i686-pc-mingw32/include/GL/glu.h:89 pragma Import (Stdcall, gluNurbsCurve, "gluNurbsCurve"); procedure gluNurbsSurface (nobj : System.Address; sknot_count : GL_gl_h.GLint; sknot : access float; tknot_count : GL_gl_h.GLint; tknot : access GL_gl_h.GLfloat; s_stride : GL_gl_h.GLint; t_stride : GL_gl_h.GLint; ctlarray : access GL_gl_h.GLfloat; sorder : GL_gl_h.GLint; torder : GL_gl_h.GLint; c_type : GL_gl_h.GLenum); -- c:\home\ochem\install\bin\../lib/gcc/i686-pc-mingw32/4.7.3/../../../../i686-pc-mingw32/include/GL/glu.h:90 pragma Import (Stdcall, gluNurbsSurface, "gluNurbsSurface"); procedure gluLoadSamplingMatrices (nobj : System.Address; modelMatrix : access GL_gl_h.GLfloat; projMatrix : access GL_gl_h.GLfloat; viewport : access GL_gl_h.GLint); -- c:\home\ochem\install\bin\../lib/gcc/i686-pc-mingw32/4.7.3/../../../../i686-pc-mingw32/include/GL/glu.h:91 pragma Import (Stdcall, gluLoadSamplingMatrices, "gluLoadSamplingMatrices"); procedure gluNurbsProperty (nobj : System.Address; property : GL_gl_h.GLenum; value : GL_gl_h.GLfloat); -- c:\home\ochem\install\bin\../lib/gcc/i686-pc-mingw32/4.7.3/../../../../i686-pc-mingw32/include/GL/glu.h:92 pragma Import (Stdcall, gluNurbsProperty, "gluNurbsProperty"); procedure gluGetNurbsProperty (nobj : System.Address; property : GL_gl_h.GLenum; value : access GL_gl_h.GLfloat); -- c:\home\ochem\install\bin\../lib/gcc/i686-pc-mingw32/4.7.3/../../../../i686-pc-mingw32/include/GL/glu.h:93 pragma Import (Stdcall, gluGetNurbsProperty, "gluGetNurbsProperty"); procedure gluNurbsCallback (nobj : System.Address; which : GL_gl_h.GLenum; fn : access procedure); -- c:\home\ochem\install\bin\../lib/gcc/i686-pc-mingw32/4.7.3/../../../../i686-pc-mingw32/include/GL/glu.h:94 pragma Import (Stdcall, gluNurbsCallback, "gluNurbsCallback"); type GLUquadricErrorProc is access procedure (arg1 : GL_gl_h.GLenum); pragma Convention (C, GLUquadricErrorProc); -- c:\home\ochem\install\bin\../lib/gcc/i686-pc-mingw32/4.7.3/../../../../i686-pc-mingw32/include/GL/glu.h:96 type GLUtessBeginProc is access procedure (arg1 : GL_gl_h.GLenum); pragma Convention (C, GLUtessBeginProc); -- c:\home\ochem\install\bin\../lib/gcc/i686-pc-mingw32/4.7.3/../../../../i686-pc-mingw32/include/GL/glu.h:97 type GLUtessEdgeFlagProc is access procedure (arg1 : GL_gl_h.GLboolean); pragma Convention (C, GLUtessEdgeFlagProc); -- c:\home\ochem\install\bin\../lib/gcc/i686-pc-mingw32/4.7.3/../../../../i686-pc-mingw32/include/GL/glu.h:98 type GLUtessVertexProc is access procedure (arg1 : System.Address); pragma Convention (C, GLUtessVertexProc); -- c:\home\ochem\install\bin\../lib/gcc/i686-pc-mingw32/4.7.3/../../../../i686-pc-mingw32/include/GL/glu.h:99 type GLUtessEndProc is access procedure; pragma Convention (C, GLUtessEndProc); -- c:\home\ochem\install\bin\../lib/gcc/i686-pc-mingw32/4.7.3/../../../../i686-pc-mingw32/include/GL/glu.h:100 type GLUtessErrorProc is access procedure (arg1 : GL_gl_h.GLenum); pragma Convention (C, GLUtessErrorProc); -- c:\home\ochem\install\bin\../lib/gcc/i686-pc-mingw32/4.7.3/../../../../i686-pc-mingw32/include/GL/glu.h:101 type GLUtessCombineProc is access procedure (arg1 : access GL_gl_h.GLdouble; arg2 : System.Address; arg3 : access GL_gl_h.GLfloat; arg4 : System.Address); pragma Convention (C, GLUtessCombineProc); -- c:\home\ochem\install\bin\../lib/gcc/i686-pc-mingw32/4.7.3/../../../../i686-pc-mingw32/include/GL/glu.h:102 type GLUtessBeginDataProc is access procedure (arg1 : GL_gl_h.GLenum; arg2 : System.Address); pragma Convention (C, GLUtessBeginDataProc); -- c:\home\ochem\install\bin\../lib/gcc/i686-pc-mingw32/4.7.3/../../../../i686-pc-mingw32/include/GL/glu.h:103 type GLUtessEdgeFlagDataProc is access procedure (arg1 : GL_gl_h.GLboolean; arg2 : System.Address); pragma Convention (C, GLUtessEdgeFlagDataProc); -- c:\home\ochem\install\bin\../lib/gcc/i686-pc-mingw32/4.7.3/../../../../i686-pc-mingw32/include/GL/glu.h:104 type GLUtessVertexDataProc is access procedure (arg1 : System.Address; arg2 : System.Address); pragma Convention (C, GLUtessVertexDataProc); -- c:\home\ochem\install\bin\../lib/gcc/i686-pc-mingw32/4.7.3/../../../../i686-pc-mingw32/include/GL/glu.h:105 type GLUtessEndDataProc is access procedure (arg1 : System.Address); pragma Convention (C, GLUtessEndDataProc); -- c:\home\ochem\install\bin\../lib/gcc/i686-pc-mingw32/4.7.3/../../../../i686-pc-mingw32/include/GL/glu.h:106 type GLUtessErrorDataProc is access procedure (arg1 : GL_gl_h.GLenum; arg2 : System.Address); pragma Convention (C, GLUtessErrorDataProc); -- c:\home\ochem\install\bin\../lib/gcc/i686-pc-mingw32/4.7.3/../../../../i686-pc-mingw32/include/GL/glu.h:107 type GLUtessCombineDataProc is access procedure (arg1 : access GL_gl_h.GLdouble; arg2 : System.Address; arg3 : access GL_gl_h.GLfloat; arg4 : System.Address; arg5 : System.Address); pragma Convention (C, GLUtessCombineDataProc); -- c:\home\ochem\install\bin\../lib/gcc/i686-pc-mingw32/4.7.3/../../../../i686-pc-mingw32/include/GL/glu.h:108 type GLUnurbsErrorProc is access procedure (arg1 : GL_gl_h.GLenum); pragma Convention (C, GLUnurbsErrorProc); -- c:\home\ochem\install\bin\../lib/gcc/i686-pc-mingw32/4.7.3/../../../../i686-pc-mingw32/include/GL/glu.h:109 procedure gluBeginPolygon (tess : System.Address); -- c:\home\ochem\install\bin\../lib/gcc/i686-pc-mingw32/4.7.3/../../../../i686-pc-mingw32/include/GL/glu.h:235 pragma Import (Stdcall, gluBeginPolygon, "gluBeginPolygon"); procedure gluNextContour (tess : System.Address; c_type : GL_gl_h.GLenum); -- c:\home\ochem\install\bin\../lib/gcc/i686-pc-mingw32/4.7.3/../../../../i686-pc-mingw32/include/GL/glu.h:236 pragma Import (Stdcall, gluNextContour, "gluNextContour"); procedure gluEndPolygon (tess : System.Address); -- c:\home\ochem\install\bin\../lib/gcc/i686-pc-mingw32/4.7.3/../../../../i686-pc-mingw32/include/GL/glu.h:237 pragma Import (Stdcall, gluEndPolygon, "gluEndPolygon"); end GL_glu_h;
charlesdaniels/libagar
Ada
3,576
ads
------------------------------------------------------------------------------ -- AGAR CORE LIBRARY -- -- A G A R . T I M E R -- -- S p e c -- ------------------------------------------------------------------------------ with Interfaces; with Interfaces.C; with Interfaces.C.Strings; with Agar.Event; with System; -- -- Interface to the Agar timer facility (AG_Timer(3) in C). Agar timers are -- generally attached to a parent Agar object. Detaching the parent object from -- its parent VFS has the effect of cancelling any active timers. -- -- Unless Agar was initialized with the Software_Timers option, Agar timers -- are implemented using the "best" available hardware interface on the current -- platform (such as BSD kqueue(2), POSIX select(2) or Linux timerfd). The -- Software_Timers option enforces a delay loop and timing wheel in software. -- package Agar.Timer is package C renames Interfaces.C; package CS renames Interfaces.C.Strings; package EV renames Agar.Event; NAME_MAX : constant Natural := $AG_TIMER_NAME_MAX; type Timer_Private is array (1 .. $SIZEOF_AG_TimerPvt) of aliased Interfaces.Unsigned_8 with Convention => C; for Timer_Private'Size use $SIZEOF_AG_TimerPvt * System.Storage_Unit; type Timer_Name is array (1 .. NAME_MAX) of aliased c.char with Convention => C; type Timer; type Timer_Access is access all Timer with Convention => C; subtype Timer_not_null_Access is not null Timer_Access; type Timer_Callback is not null access function (Timer : Timer_Access; Event : EV.Event_Access) return Interfaces.Unsigned_32 with Convention => C; type Timer is limited record Identifier : C.int; Parent_Object : System.Address; Flags : C.unsigned; Expiration_Time : Interfaces.Unsigned_32; Interval : Interfaces.Unsigned_32; Callback_Func : Timer_Callback; Callback_Args : EV.Event; Name : Timer_Name; Private_Data : Timer_Private; end record with Convention => C; procedure Init_Timer (Timer : in Timer_not_null_Access; Name : in String); -- Initialize an (initially unattached) timer. function Add_Timer (Timer : in Timer_not_null_Access; Interval : in Interfaces.Unsigned_32; Func : in Timer_Callback) return Boolean; -- Start a global timer not attached to a specific object. function Add_Timer (Interval : in Interfaces.Unsigned_32; Func : in Timer_Callback) return Boolean; -- Start a global, auto-allocated timer not attached to a specific object. private procedure AG_InitTimer (Timer : in Timer_not_null_Access; Name : in CS.chars_ptr; Flags : in C.unsigned) with Import, Convention => C, Link_Name => "AG_InitTimer"; function AG_AddTimer (Object : in System.Address; Timer : in Timer_not_null_Access; Interval : in Interfaces.Unsigned_32; Func : in Timer_Callback; Flags : in C.unsigned; Format : in CS.chars_ptr) return C.int with Import, Convention => C, Link_Name => "AG_AddTimer"; function AG_AddTimerAuto (Object : in System.Address; Interval : in Interfaces.Unsigned_32; Func : in Timer_Callback; Format : in CS.chars_ptr) return Timer_Access with Import, Convention => C, Link_Name => "AG_AddTimerAuto"; end Agar.Timer;
zhmu/ananas
Ada
16,255
adb
------------------------------------------------------------------------------ -- -- -- GNAT COMPILER COMPONENTS -- -- -- -- F M A P -- -- -- -- B o d y -- -- -- -- Copyright (C) 2001-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. -- -- -- ------------------------------------------------------------------------------ with Opt; use Opt; with Osint; use Osint; with Output; use Output; with Table; with Types; use Types; pragma Warnings (Off); -- This package is used also by gnatcoll with System.OS_Lib; use System.OS_Lib; pragma Warnings (On); with Unchecked_Conversion; with GNAT.HTable; package body Fmap is No_Mapping_File : Boolean := False; -- Set to True when the specified mapping file cannot be read in -- procedure Initialize, so that no attempt is made to open the mapping -- file in procedure Update_Mapping_File. Max_Buffer : constant := 1_500; Buffer : String (1 .. Max_Buffer); -- Used to buffer output when writing to a new mapping file Buffer_Last : Natural := 0; -- Index of last valid character in Buffer type Mapping is record Uname : Unit_Name_Type; Fname : File_Name_Type; end record; package File_Mapping is new Table.Table ( Table_Component_Type => Mapping, Table_Index_Type => Int, Table_Low_Bound => 0, Table_Initial => 1_000, Table_Increment => 1_000, Table_Name => "Fmap.File_Mapping"); -- Mapping table to map unit names to file names package Path_Mapping is new Table.Table ( Table_Component_Type => Mapping, Table_Index_Type => Int, Table_Low_Bound => 0, Table_Initial => 1_000, Table_Increment => 1_000, Table_Name => "Fmap.Path_Mapping"); -- Mapping table to map file names to path names type Header_Num is range 0 .. 1_000; function Hash (F : Unit_Name_Type) return Header_Num; -- Function used to compute hash of unit name No_Entry : constant Int := -1; -- Signals no entry in following table package Unit_Hash_Table is new GNAT.HTable.Simple_HTable ( Header_Num => Header_Num, Element => Int, No_Element => No_Entry, Key => Unit_Name_Type, Hash => Hash, Equal => "="); -- Hash table to map unit names to file names. Used in conjunction with -- table File_Mapping above. function Hash (F : File_Name_Type) return Header_Num; -- Function used to compute hash of file name package File_Hash_Table is new GNAT.HTable.Simple_HTable ( Header_Num => Header_Num, Element => Int, No_Element => No_Entry, Key => File_Name_Type, Hash => Hash, Equal => "="); -- Hash table to map file names to path names. Used in conjunction with -- table Path_Mapping above. Last_In_Table : Int := 0; package Forbidden_Names is new GNAT.HTable.Simple_HTable ( Header_Num => Header_Num, Element => Boolean, No_Element => False, Key => File_Name_Type, Hash => Hash, Equal => "="); ----------------------------- -- Add_Forbidden_File_Name -- ----------------------------- procedure Add_Forbidden_File_Name (Name : File_Name_Type) is begin Forbidden_Names.Set (Name, True); end Add_Forbidden_File_Name; --------------------- -- Add_To_File_Map -- --------------------- procedure Add_To_File_Map (Unit_Name : Unit_Name_Type; File_Name : File_Name_Type; Path_Name : File_Name_Type) is Unit_Entry : constant Int := Unit_Hash_Table.Get (Unit_Name); File_Entry : constant Int := File_Hash_Table.Get (File_Name); begin if Unit_Entry = No_Entry or else File_Mapping.Table (Unit_Entry).Fname /= File_Name then File_Mapping.Increment_Last; Unit_Hash_Table.Set (Unit_Name, File_Mapping.Last); File_Mapping.Table (File_Mapping.Last) := (Uname => Unit_Name, Fname => File_Name); end if; if File_Entry = No_Entry or else Path_Mapping.Table (File_Entry).Fname /= Path_Name then Path_Mapping.Increment_Last; File_Hash_Table.Set (File_Name, Path_Mapping.Last); Path_Mapping.Table (Path_Mapping.Last) := (Uname => Unit_Name, Fname => Path_Name); end if; end Add_To_File_Map; ---------- -- Hash -- ---------- function Hash (F : File_Name_Type) return Header_Num is begin return Header_Num (Int (F) mod Header_Num'Range_Length); end Hash; function Hash (F : Unit_Name_Type) return Header_Num is begin return Header_Num (Int (F) mod Header_Num'Range_Length); end Hash; ---------------- -- Initialize -- ---------------- procedure Initialize (File_Name : String) is FD : File_Descriptor; Src : Source_Buffer_Ptr; Hi : Source_Ptr; First : Source_Ptr := 1; Last : Source_Ptr := 0; Uname : Unit_Name_Type; Fname : File_Name_Type; Pname : File_Name_Type; procedure Empty_Tables; -- Remove all entries in case of incorrect mapping file function Find_File_Name return File_Name_Type; -- Return Error_File_Name if the name buffer contains "/", otherwise -- call Name_Find. "/" is the path name in the mapping file to indicate -- that a source has been suppressed, and thus should not be found by -- the compiler. function Find_Unit_Name return Unit_Name_Type; -- Return the unit name in the name buffer. Return Error_Unit_Name if -- the name buffer contains "/". procedure Get_Line; -- Get a line from the mapping file, where a line is Src (First .. Last) procedure Report_Truncated; -- Report a warning when the mapping file is truncated -- (number of lines is not a multiple of 3). ------------------ -- Empty_Tables -- ------------------ procedure Empty_Tables is begin Unit_Hash_Table.Reset; File_Hash_Table.Reset; Path_Mapping.Set_Last (0); File_Mapping.Set_Last (0); Last_In_Table := 0; end Empty_Tables; -------------------- -- Find_File_Name -- -------------------- function Find_File_Name return File_Name_Type is begin if Name_Buffer (1 .. Name_Len) = "/" then -- A path name of "/" is the indication that the source has been -- "suppressed". Return Error_File_Name so that the compiler does -- not find the source, even if it is in the include path. return Error_File_Name; else return Name_Find; end if; end Find_File_Name; -------------------- -- Find_Unit_Name -- -------------------- function Find_Unit_Name return Unit_Name_Type is begin return Unit_Name_Type (Find_File_Name); end Find_Unit_Name; -------------- -- Get_Line -- -------------- procedure Get_Line is use ASCII; begin First := Last + 1; -- If not at the end of file, skip the end of line while First < Src'Last and then (Src (First) = CR or else Src (First) = LF or else Src (First) = EOF) loop First := First + 1; end loop; -- If not at the end of file, find the end of this new line if First < Src'Last and then Src (First) /= EOF then Last := First; while Last < Src'Last and then Src (Last + 1) /= CR and then Src (Last + 1) /= LF and then Src (Last + 1) /= EOF loop Last := Last + 1; end loop; end if; end Get_Line; ---------------------- -- Report_Truncated -- ---------------------- procedure Report_Truncated is begin Write_Str ("warning: mapping file """); Write_Str (File_Name); Write_Line (""" is truncated"); end Report_Truncated; -- Start of processing for Initialize begin Empty_Tables; Read_Source_File (Name_Enter (File_Name), 1, Hi, Src, FD, Config); if Null_Source_Buffer_Ptr (Src) then if FD = Osint.Null_FD then Write_Str ("warning: could not locate mapping file """); else Write_Str ("warning: no read access for mapping file """); end if; Write_Str (File_Name); Write_Line (""""); No_Mapping_File := True; else loop -- Get the unit name Get_Line; -- Exit if end of file has been reached exit when First > Last; if (Last < First + 2) or else (Src (Last - 1) /= '%') or else (Src (Last) /= 's' and then Src (Last) /= 'b') then Write_Line ("warning: mapping file """ & File_Name & """ is incorrectly formatted"); Write_Line ("Line = """ & String (Src (First .. Last)) & '"'); Empty_Tables; return; end if; Name_Len := Integer (Last - First + 1); Name_Buffer (1 .. Name_Len) := String (Src (First .. Last)); Uname := Find_Unit_Name; -- Get the file name Get_Line; -- If end of line has been reached, file is truncated if First > Last then Report_Truncated; Empty_Tables; return; end if; Name_Len := Integer (Last - First + 1); Name_Buffer (1 .. Name_Len) := String (Src (First .. Last)); Canonical_Case_File_Name (Name_Buffer (1 .. Name_Len)); Fname := Find_File_Name; -- Get the path name Get_Line; -- If end of line has been reached, file is truncated if First > Last then Report_Truncated; Empty_Tables; return; end if; Name_Len := Integer (Last - First + 1); Name_Buffer (1 .. Name_Len) := String (Src (First .. Last)); Pname := Find_File_Name; -- Add the mappings for this unit name Add_To_File_Map (Uname, Fname, Pname); end loop; end if; -- Record the length of the two mapping tables Last_In_Table := File_Mapping.Last; end Initialize; ---------------------- -- Mapped_File_Name -- ---------------------- function Mapped_File_Name (Unit : Unit_Name_Type) return File_Name_Type is The_Index : constant Int := Unit_Hash_Table.Get (Unit); begin if The_Index = No_Entry then return No_File; else return File_Mapping.Table (The_Index).Fname; end if; end Mapped_File_Name; ---------------------- -- Mapped_Path_Name -- ---------------------- function Mapped_Path_Name (File : File_Name_Type) return File_Name_Type is Index : Int := No_Entry; begin if Forbidden_Names.Get (File) then return Error_File_Name; end if; Index := File_Hash_Table.Get (File); if Index = No_Entry then return No_File; else return Path_Mapping.Table (Index).Fname; end if; end Mapped_Path_Name; ------------------ -- Reset_Tables -- ------------------ procedure Reset_Tables is begin File_Mapping.Init; Path_Mapping.Init; Unit_Hash_Table.Reset; File_Hash_Table.Reset; Forbidden_Names.Reset; Last_In_Table := 0; end Reset_Tables; ------------------------- -- Update_Mapping_File -- ------------------------- procedure Update_Mapping_File (File_Name : String) is File : File_Descriptor; N_Bytes : Integer; File_Entry : Int; Status : Boolean; -- For the call to Close procedure Put_Line (Name : Name_Id); -- Put Name as a line in the Mapping File -------------- -- Put_Line -- -------------- procedure Put_Line (Name : Name_Id) is begin Get_Name_String (Name); -- If the Buffer is full, write it to the file if Buffer_Last + Name_Len + 1 > Buffer'Last then N_Bytes := Write (File, Buffer (1)'Address, Buffer_Last); if N_Bytes < Buffer_Last then Fail ("disk full"); end if; Buffer_Last := 0; end if; -- Add the line to the Buffer Buffer (Buffer_Last + 1 .. Buffer_Last + Name_Len) := Name_Buffer (1 .. Name_Len); Buffer_Last := Buffer_Last + Name_Len + 1; Buffer (Buffer_Last) := ASCII.LF; end Put_Line; -- Start of processing for Update_Mapping_File begin -- If the mapping file could not be read, then it will not be possible -- to update it. if No_Mapping_File then return; end if; -- Only Update if there are new entries in the mappings if Last_In_Table < File_Mapping.Last then File := Open_Read_Write (Name => File_Name, Fmode => Binary); if File /= Invalid_FD then if Last_In_Table > 0 then Lseek (File, 0, Seek_End); end if; for Unit in Last_In_Table + 1 .. File_Mapping.Last loop Put_Line (Name_Id (File_Mapping.Table (Unit).Uname)); Put_Line (Name_Id (File_Mapping.Table (Unit).Fname)); File_Entry := File_Hash_Table.Get (File_Mapping.Table (Unit).Fname); Put_Line (Name_Id (Path_Mapping.Table (File_Entry).Fname)); end loop; -- Before closing the file, write the buffer to the file. It is -- guaranteed that the Buffer is not empty, because Put_Line has -- been called at least 3 times, and after a call to Put_Line, the -- Buffer is not empty. N_Bytes := Write (File, Buffer (1)'Address, Buffer_Last); if N_Bytes < Buffer_Last then Fail ("disk full"); end if; Close (File, Status); if not Status then Fail ("disk full"); end if; elsif not Quiet_Output then Write_Str ("warning: could not open mapping file """); Write_Str (File_Name); Write_Line (""" for update"); end if; end if; end Update_Mapping_File; end Fmap;
davidkristola/vole
Ada
13,753
adb
with Ada.Unchecked_Deallocation; with Ada.Unchecked_Conversion; with System; with kv.avm.memories; with kv.avm.Log; use kv.avm.Log; with kv.avm.Instances; with kv.avm.Messages; with kv.avm.Actor_Pool; with kv.avm.Executables; package body kv.avm.Frames is use Interfaces; use kv.avm.Instructions; use kv.avm.Registers; ----------------------------------------------------------------------------- procedure Initialize (Self : in out Frame_Type; Instance : in kv.avm.Actor_References.Actor_Reference_Type; Name : in kv.avm.Registers.String_Type; Invoker : in kv.avm.Actor_References.Actor_Reference_Type; Future : in Interfaces.Unsigned_32; Code : in kv.avm.Instructions.Code_Access; Memory : in kv.avm.Memories.Memory_Type; Next : in Frame_Access := null) is begin Self.Instance := Instance; Self.Name := Name; Self.Invoker := Invoker; Self.Future := Future; Self.Code := Code; Self.Memory := Memory; Self.Pc := Code'FIRST; Self.RunningF := True; Self.Blocked := False; Self.Next := Next; if Next = null then Self.Depth := 1; else Self.Depth := Next.Depth + 1; end if; end Initialize; ----------------------------------------------------------------------------- function Program_Counter (Self : in Frame_Type) return Interfaces.Unsigned_32 is begin return Self.Pc; end Program_Counter; ----------------------------------------------------------------------------- procedure Set_Program_Counter (Self : in out Frame_Type; Pc : in Interfaces.Unsigned_32) is begin if Pc in Self.Code'RANGE then Self.Pc := Pc; else Self.RunningF := False; raise Program_Counter_Error; end if; end Set_Program_Counter; ----------------------------------------------------------------------------- procedure Increment_Program_Counter (Self : in out Frame_Type) is begin Self.Set_Program_Counter(Self.Pc + 1); end Increment_Program_Counter; ----------------------------------------------------------------------------- function Is_Done(Self : Frame_Type) return Boolean is begin return not Self.RunningF; --return not (Self.RunningF or Self.Blocked); end Is_Done; ----------------------------------------------------------------------------- function Get_Running (Self : in Frame_Type) return Boolean is begin return Self.RunningF; --return Self.RunningF and not Self.Blocked; end Get_Running; ----------------------------------------------------------------------------- procedure Set_Running (Self : in out Frame_Type; Running : in Boolean) is begin Self.RunningF := Running; end Set_Running; ----------------------------------------------------------------------------- procedure Set_Blocked (Self : in out Frame_Type; Blocked : in Boolean) is begin Self.Blocked := Blocked; end Set_Blocked; ----------------------------------------------------------------------------- function Fetch_Instruction (Self : in Frame_Type) return kv.avm.Instructions.Instruction_Type is begin return Self.Code(Self.Pc); end Fetch_Instruction; ----------------------------------------------------------------------------- procedure Fetch_And_Increment -- Fetch an instruction and increment the program counter by one (Self : in out Frame_Type; Instruction : out kv.avm.Instructions.Instruction_Type) is begin Instruction := Self.Fetch_Instruction; Self.Increment_Program_Counter; end Fetch_And_Increment; ----------------------------------------------------------------------------- procedure Vet_Operands (Self : in out Frame_Type; Target : in Reference_Type; Source : in Reference_Type) is Target_Format : Data_Kind := Self.Get(Target).Format; Source_Format : Data_Kind := Self.Get(Source).Format; begin if Target.Memory = Fixed then raise Fixed_Target_Error; end if; if Source_Format = Unset then raise Invalid_Source_Error; elsif Target_Format = Unset then null; -- This is not only fine, but often expected elsif Source_Format /= Target_Format then raise Operand_Mismatch_Error; end if; end Vet_Operands; ----------------------------------------------------------------------------- procedure Vet_Operands (Self : in out Frame_Type; Target : in Reference_Type; Source_1 : in Reference_Type; Source_2 : in Reference_Type) is Source_1_Format : Data_Kind := Self.Get(Source_1).Format; Source_2_Format : Data_Kind := Self.Get(Source_2).Format; begin Self.Vet_Operands(Target, Source_1); Self.Vet_Operands(Target, Source_2); if Source_1_Format /= Source_2_Format then raise Operand_Mismatch_Error; end if; end Vet_Operands; ----------------------------------------------------------------------------- function Get (Self : in Frame_Type; Ref : in Reference_Type) return kv.avm.Registers.Register_Type is use kv.avm.Memories; begin if not Self.Memory.Get(Ref.Memory).Is_Set then Put_Line("ERROR: kv.avm.frame.Get, Self.Memory(" & Register_Bank_Type'IMAGE(Ref.Memory) & ") is null!"); end if; return Self.Memory.Read(Ref); end Get; ----------------------------------------------------------------------------- procedure Set (Self : in out Frame_Type; Ref : in Reference_Type; Value : in kv.avm.Registers.Register_Type) is begin Self.Memory.Write(Ref, Value); end Set; ----------------------------------------------------------------------------- function Get_Invoker(Self : Frame_Type) return kv.avm.Actor_References.Actor_Reference_Type is begin return Self.Invoker; end Get_Invoker; ----------------------------------------------------------------------------- function Get_Instance(Self : Frame_Type) return kv.avm.Actor_References.Actor_Reference_Type is begin return Self.Instance; end Get_Instance; ----------------------------------------------------------------------------- function Is_Self_Replying(Self : Frame_Type) return Boolean is use kv.avm.Actor_References; begin return Self.Instance = Self.Invoker; end Is_Self_Replying; ----------------------------------------------------------------------------- function Get_Name(Self : Frame_Type) return String is use kv.avm.Registers; begin return +Self.Name; end Get_Name; ----------------------------------------------------------------------------- procedure Set_Invoker -- Test routine (Self : in out Frame_Type; Invoker : in kv.avm.Actor_References.Actor_Reference_Type) is begin Self.Invoker := Invoker; end Set_Invoker; ----------------------------------------------------------------------------- procedure Set_Future -- Test routine (Self : in out Frame_Type; Future : in Interfaces.Unsigned_32) is begin Self.Future := Future; end Set_Future; ----------------------------------------------------------------------------- function Fold (Self : in Frame_Type; Ref : in Reference_Type) return kv.avm.Tuples.Tuple_Type is Map : kv.avm.Tuples.Map_Type := Self.Get(Ref).Map; Answer : kv.avm.Tuples.Tuple_Type; begin Answer.Fold(Self.Memory, Map); return Answer; end Fold; ----------------------------------------------------------------------------- procedure Process_Gosub_Response (Self : in out Frame_Type; Answer : in kv.avm.Tuples.Tuple_Type) is begin Self.Set(Self.Future_R, (format => kv.avm.Registers.Tuple, folded_tuple => Answer)); end Process_Gosub_Response; ----------------------------------------------------------------------------- procedure Resolve_Future (Self : in out Frame_Type; Answer : in kv.avm.Tuples.Tuple_Type; Future : in Interfaces.Unsigned_32) is Found : Boolean; Location : kv.avm.References.Reference_Type; begin Self.Memory.Find_Future(Local, Future, Found, Location); if Found then Self.Memory.Write(Location, (Format => kv.avm.Registers.Tuple, folded_tuple => Answer)); Put_Line("Future"&Interfaces.Unsigned_32'IMAGE(Future)&" resolved!"); Self.Blocked := False; return; end if; if Self.Next = null then -- The future wasn't here and there is nowhere else to look. raise kv.avm.Executables.Corrupt_Executable_Error; else Self.Next.Resolve_Future(Answer, Future); end if; end Resolve_Future; ----------------------------------------------------------------------------- function Reachable(Self : Frame_Type) return kv.avm.Actor_References.Sets.Set is Can_Reach : kv.avm.Actor_References.Sets.Set := kv.avm.Actor_References.Sets.Empty_Set; use kv.avm.Actor_References; begin if Self.Invoker /= Null_Reference then Can_Reach.Include(Self.Invoker); end if; if Self.Next /= null then Can_Reach.Union(Self.Next.Reachable); end if; Can_Reach.Union(Self.Memory.Reachable(kv.avm.References.Input)); Can_Reach.Union(Self.Memory.Reachable(kv.avm.References.Local)); return Can_Reach; end Reachable; ----------------------------------------------------------------------------- procedure Set_Reply_Information (Self : in out Frame_Type; Reply_To : in Reference_Type; Future : in Interfaces.Unsigned_32) is begin Self.Set(Reply_To, (Format => kv.avm.Registers.Future, ID => Future)); Self.Future_R := Reply_To; end Set_Reply_Information; ----------------------------------------------------------------------------- function Get_Invoker_Future(self : Frame_Type) return Interfaces.Unsigned_32 is begin return Self.Future; end Get_Invoker_Future; ----------------------------------------------------------------------------- function True_Instance(Instance_Ref : kv.avm.Actor_References.Actor_Reference_Type) return kv.avm.Executables.Executable_Access is begin return kv.avm.Actor_Pool.Resolve(Instance_Ref); end True_Instance; ----------------------------------------------------------------------------- procedure Process_Gosub (Self : in out Frame_Type; Tail_Call : in Boolean; Supercall : in Boolean; Message_Name : in kv.avm.Registers.String_Type; Data : in kv.avm.Tuples.Tuple_Type; Future : in Interfaces.Unsigned_32) is Reply_To : kv.avm.Actor_References.Actor_Reference_Type; Frame_Instance : kv.avm.Executables.Executable_Access; use kv.avm.Registers; begin if Tail_Call then Reply_To := Self.Invoker; else Reply_To := Self.Instance; end if; Put_Line("kv.avm.frame.Process_Gosub"& ", Name=" & (+Message_Name) & ", tail_call="&Boolean'IMAGE(Tail_Call)& ", Future="&Interfaces.Unsigned_32'IMAGE(Future) & "@" & Reply_To.Image); Frame_Instance := kv.avm.Actor_Pool.Resolve(Self.Instance); Frame_Instance.Process_Gosub (Tailcall => Tail_Call, Supercall => Supercall, Reply_To => Reply_To, Method => Message_Name, Data => Data.Unfolded, Future => Future); end Process_Gosub; ----------------------------------------------------------------------------- function Get_Next(Self : Frame_Type) return Frame_Access is begin return Self.Next; end Get_Next; ----------------------------------------------------------------------------- procedure Halt_Actor (Self : in out Frame_Type) is Frame_Instance : kv.avm.Executables.Executable_Access; begin Frame_Instance := kv.avm.Actor_Pool.Resolve(Self.Instance); Frame_Instance.Halt_Actor; end Halt_Actor; ----------------------------------------------------------------------------- function Image(Self : Frame_Type) return String is use kv.avm.Registers; begin return True_Instance(Self.Instance).Image & "." & (+Self.Name) & "(depth"&Positive'IMAGE(Self.Depth)&")" & "@" & Interfaces.Unsigned_32'IMAGE(Self.Pc); end Image; ----------------------------------------------------------------------------- function Debug_Info(Self : Frame_Type) return String is Inst : kv.avm.Instructions.Instruction_Type := Self.Fetch_Instruction; use kv.avm.Registers; begin return True_Instance(Self.Instance).Image & "." & (+Self.Name) & "(depth"&Positive'IMAGE(Self.Depth)&")" & "@" & Interfaces.Unsigned_32'IMAGE(Self.Pc) & ":" & kv.avm.memories.Instruction_Image(Inst, Self.Memory); -- ":" & kv.avm.memories.Instruction_Image(Inst, Convert(Self.Memory'ADDRESS)); end Debug_Info; ----------------------------------------------------------------------------- procedure Prepare_For_Deletion(Self : in out Frame_Type) is begin if Self.RunningF then Put_Error("Running frame is being deleted!"); end if; end Prepare_For_Deletion; end kv.avm.Frames;
reznikmm/matreshka
Ada
7,000
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.Modification_Time_Elements is ------------ -- Create -- ------------ overriding function Create (Parameters : not null access Matreshka.DOM_Elements.Element_L2_Parameters) return Text_Modification_Time_Element_Node is begin return Self : Text_Modification_Time_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_Modification_Time_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_Modification_Time (ODF.DOM.Text_Modification_Time_Elements.ODF_Text_Modification_Time_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_Modification_Time_Element_Node) return League.Strings.Universal_String is pragma Unreferenced (Self); begin return Matreshka.ODF_String_Constants.Modification_Time_Element; end Get_Local_Name; ---------------- -- Leave_Node -- ---------------- overriding procedure Leave_Node (Self : not null access Text_Modification_Time_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_Modification_Time (ODF.DOM.Text_Modification_Time_Elements.ODF_Text_Modification_Time_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_Modification_Time_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_Modification_Time (Visitor, ODF.DOM.Text_Modification_Time_Elements.ODF_Text_Modification_Time_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.Modification_Time_Element, Text_Modification_Time_Element_Node'Tag); end Matreshka.ODF_Text.Modification_Time_Elements;
AdaCore/training_material
Ada
5,164
ads
pragma Ada_2005; pragma Style_Checks (Off); with Interfaces.C; use Interfaces.C; with SDL_stdinc_h; package SDL_rect_h is -- Simple DirectMedia Layer -- Copyright (C) 1997-2018 Sam Lantinga <[email protected]> -- This software is provided 'as-is', without any express or implied -- warranty. In no event will the authors be held liable for any damages -- arising from the use of this software. -- Permission is granted to anyone to use this software for any purpose, -- including commercial applications, and to alter it and redistribute it -- freely, subject to the following restrictions: -- 1. The origin of this software must not be misrepresented; you must not -- claim that you wrote the original software. If you use this software -- in a product, an acknowledgment in the product documentation would be -- appreciated but is not required. -- 2. Altered source versions must be plainly marked as such, and must not be -- misrepresented as being the original software. -- 3. This notice may not be removed or altered from any source distribution. -- --* -- * \file SDL_rect.h -- * -- * Header file for SDL_rect definition and management functions. -- -- Set up for C function definitions, even when using C++ --* -- * \brief The structure that defines a point -- * -- * \sa SDL_EnclosePoints -- * \sa SDL_PointInRect -- type SDL_Point is record x : aliased int; -- ..\SDL2_tmp\SDL_rect.h:50 y : aliased int; -- ..\SDL2_tmp\SDL_rect.h:51 end record; pragma Convention (C_Pass_By_Copy, SDL_Point); -- ..\SDL2_tmp\SDL_rect.h:48 --* -- * \brief A rectangle, with the origin at the upper left. -- * -- * \sa SDL_RectEmpty -- * \sa SDL_RectEquals -- * \sa SDL_HasIntersection -- * \sa SDL_IntersectRect -- * \sa SDL_UnionRect -- * \sa SDL_EnclosePoints -- type SDL_Rect is record x : aliased int; -- ..\SDL2_tmp\SDL_rect.h:66 y : aliased int; -- ..\SDL2_tmp\SDL_rect.h:66 w : aliased int; -- ..\SDL2_tmp\SDL_rect.h:67 h : aliased int; -- ..\SDL2_tmp\SDL_rect.h:67 end record; pragma Convention (C_Pass_By_Copy, SDL_Rect); -- ..\SDL2_tmp\SDL_rect.h:64 --* -- * \brief Returns true if point resides inside a rectangle. -- function SDL_PointInRect (p : access constant SDL_Point; r : access constant SDL_Rect) return SDL_stdinc_h.SDL_bool; -- ..\SDL2_tmp\SDL_rect.h:73 pragma Import (C, SDL_PointInRect, "SDL_PointInRect"); --* -- * \brief Returns true if the rectangle has no area. -- function SDL_RectEmpty (r : access constant SDL_Rect) return SDL_stdinc_h.SDL_bool; -- ..\SDL2_tmp\SDL_rect.h:82 pragma Import (C, SDL_RectEmpty, "SDL_RectEmpty"); --* -- * \brief Returns true if the two rectangles are equal. -- function SDL_RectEquals (a : access constant SDL_Rect; b : access constant SDL_Rect) return SDL_stdinc_h.SDL_bool; -- ..\SDL2_tmp\SDL_rect.h:90 pragma Import (C, SDL_RectEquals, "SDL_RectEquals"); --* -- * \brief Determine whether two rectangles intersect. -- * -- * \return SDL_TRUE if there is an intersection, SDL_FALSE otherwise. -- function SDL_HasIntersection (A : access constant SDL_Rect; B : access constant SDL_Rect) return SDL_stdinc_h.SDL_bool; -- ..\SDL2_tmp\SDL_rect.h:101 pragma Import (C, SDL_HasIntersection, "SDL_HasIntersection"); --* -- * \brief Calculate the intersection of two rectangles. -- * -- * \return SDL_TRUE if there is an intersection, SDL_FALSE otherwise. -- function SDL_IntersectRect (A : access constant SDL_Rect; B : access constant SDL_Rect; result : access SDL_Rect) return SDL_stdinc_h.SDL_bool; -- ..\SDL2_tmp\SDL_rect.h:109 pragma Import (C, SDL_IntersectRect, "SDL_IntersectRect"); --* -- * \brief Calculate the union of two rectangles. -- procedure SDL_UnionRect (A : access constant SDL_Rect; B : access constant SDL_Rect; result : access SDL_Rect); -- ..\SDL2_tmp\SDL_rect.h:116 pragma Import (C, SDL_UnionRect, "SDL_UnionRect"); --* -- * \brief Calculate a minimal rectangle enclosing a set of points -- * -- * \return SDL_TRUE if any points were within the clipping rect -- function SDL_EnclosePoints (points : access constant SDL_Point; count : int; clip : access constant SDL_Rect; result : access SDL_Rect) return SDL_stdinc_h.SDL_bool; -- ..\SDL2_tmp\SDL_rect.h:125 pragma Import (C, SDL_EnclosePoints, "SDL_EnclosePoints"); --* -- * \brief Calculate the intersection of a rectangle and line segment. -- * -- * \return SDL_TRUE if there is an intersection, SDL_FALSE otherwise. -- function SDL_IntersectRectAndLine (rect : access constant SDL_Rect; X1 : access int; Y1 : access int; X2 : access int; Y2 : access int) return SDL_stdinc_h.SDL_bool; -- ..\SDL2_tmp\SDL_rect.h:135 pragma Import (C, SDL_IntersectRectAndLine, "SDL_IntersectRectAndLine"); -- Ends C function definitions when using C++ -- vi: set ts=4 sw=4 expandtab: end SDL_rect_h;
Fabien-Chouteau/lvgl-ada-simulator
Ada
20,433
adb
with System; with Ada.Exceptions; with Ada.Strings.Unbounded; with Ada.Real_Time; use Ada.Real_Time; with Ada.Containers.Doubly_Linked_Lists; with GNAT.OS_Lib; with Ada.Text_IO; use Ada.Text_IO; with Sf.Window.VideoMode; use Sf.Window.VideoMode; with Sf.Window.Keyboard; with Sf.Graphics; use Sf.Graphics; with Sf.Graphics.Rect; with Sf.Graphics.Sprite; use Sf.Graphics.Sprite; with Sf.Graphics.Texture; use Sf.Graphics.Texture; with Sf.Graphics.RenderTexture; use Sf.Graphics.RenderTexture; with Sf.Graphics.View; use Sf.Graphics.View; with Sf.Graphics.RenderWindow; use Sf.Graphics.RenderWindow; with Sf.Graphics.Image; with Sf.Window.Window; use Sf.Window.Window; with Sf.Window.Event; use Sf.Window.Event; with Sf.Window.Mouse; use Sf.Window.Mouse; with Sf; use Sf; with Sf.System.Vector2; use Sf.System.Vector2; with Interfaces; use Interfaces; with Lvgl_Ada_Config; with Lv; use Lv; with Lv.Vdb; with Lv.Color; with Lv.Area; with Lv.Hal.Disp; use Lv.Hal.Disp; with Lv.Hal.Indev; use Lv.Hal.Indev; with Lv.Objx; with Lv.Objx.Img; with Lv.Indev; package body LVGL_Ada_Simulator is Screen_Width : constant := Lvgl_Ada_Config.Horizontal_Resolution; Screen_Height : constant := Lvgl_Ada_Config.Vertical_Resolution; Frame_Buffer : array (0 .. (Screen_Width * Screen_Height * 4) - 1) of aliased Sf.sfUint8 := (others => 100); Port : Sf.Graphics.Rect.sfFloatRect := (0.0, 0.0, 1.0, 1.0); Win_Width, Win_Height : sfUint32 := 1; Title : Ada.Strings.Unbounded.Unbounded_String; Refresh_Rate : Positive := 60; -- LVGL -- package LVGL_Event_Queue is package LVGL_Event_List is new Ada.Containers.Doubly_Linked_Lists (Indev_Data_T); protected type Queue is procedure Push (Elt : Indev_Data_T); procedure Pop (Elt : out Indev_Data_T; Success : out Boolean); private List : LVGL_Event_List.List; end Queue; end LVGL_Event_Queue; package body LVGL_Event_Queue is protected body Queue is procedure Push (Elt : Indev_Data_T) is begin List.Append (Elt); end Push; procedure Pop (Elt : out Indev_Data_T; Success : out Boolean) is begin if List.Is_Empty then Success := False; else Success := True; Elt := List.First_Element; List.Delete_First; end if; end Pop; end Queue; end LVGL_Event_Queue; LV_Disp_Drv : aliased Disp_Drv_T; LV_Disp : Disp_T; Pointer_Enabled : Boolean := False; LV_Indev_Pointer_Drv : aliased Indev_Drv_T; LV_Indev_Pointer : Indev_T; Cursor_Obj : Lv.Objx.Img.Instance; Pointer_Queue : LVGL_Event_Queue.Queue; In_Pointer_Pos : Lv.Area.Point_T := (1, 1); In_Pointer_State : Lv.Hal.Indev.Indev_State_T := Lv.Hal.Indev.State_Rel; Out_Pointer_Pos : Lv.Area.Point_T := (1, 1); Out_Pointer_State : Lv.Hal.Indev.Indev_State_T := Lv.Hal.Indev.State_Rel; Keypad_Enabled : Boolean := False; LV_Indev_Keypad_Drv : aliased Indev_Drv_T; LV_Indev_Keypad : Indev_T; Keypad_Queue : LVGL_Event_Queue.Queue; function Read_Pointer (Data : access Indev_Data_T) return U_Bool with Convention => C; function Read_Keypad (Data : access Indev_Data_T) return U_Bool with Convention => C; procedure Disp_Flush (X1 : Int32_T; Y1 : Int32_T; X2 : Int32_T; Y2 : Int32_T; Color : access constant Color_Array) with Convention => C; procedure Disp_Fill (X1 : Int32_T; Y1 : Int32_T; X2 : Int32_T; Y2 : Int32_T; Color : Lv.Color.Color_T) with Convention => C; procedure Disp_Map (X1 : Int32_T; Y1 : Int32_T; X2 : Int32_T; Y2 : Int32_T; Color : access constant Color_Array) with Convention => C; ------------------ -- To_LVGL_Code -- ------------------ function To_LVGL_Code (Key : Sf.Window.Event.sfKeyEvent) return Lv.Uint32_T is use Sf.Window.Keyboard; begin case Key.code is when sfKeyUp => return Lv.LV_KEY_UP; when sfKeyDown => return Lv.LV_KEY_DOWN; when sfKeyRight => return Lv.LV_KEY_RIGHT; when sfKeyLeft => return Lv.LV_KEY_LEFT; when sfKeyEscape => return Lv.LV_KEY_ESC; when sfKeyDelete => return Lv.LV_KEY_DEL; when sfKeyBack => return Lv.LV_KEY_BACKSPACE; when sfKeyEnter => return Lv.LV_KEY_ENTER; when sfKeyHome => return LV.LV_KEY_HOME; when sfKeyEnd => return LV.LV_KEY_END; when sfKeySpace => return Character'Enum_Rep (' '); when sfKeyNum0 .. sfKeyNum9 => return Character'Enum_Rep ('0') + Lv.Uint32_T (Key.code - sfKeyNum0); when sfKeyA .. sfKeyZ => if Key.shift then return Character'Enum_Rep ('A') + Lv.Uint32_T (Key.code - sfKeyA); else return Character'Enum_Rep ('a') + Lv.Uint32_T (Key.code - sfKeyA); end if; when others => return 1; end case; end To_LVGL_Code; -------------- -- Viewport -- -------------- function Viewport (View : Sf.Graphics.sfView_Ptr; Width, Height : sfUint32) return Sf.Graphics.Rect.sfFloatRect is Win_Ratio : constant Float := Float (Width) / Float (Height); View_Ratio : constant Float := getSize (View).x / getSize (View).y; Size_X : Float := 1.0; Size_Y : Float := 1.0; Pos_X : Float := 0.0; Pos_Y : Float := 0.0; begin if Win_Ratio < View_Ratio then Size_Y := Win_Ratio / View_Ratio; Pos_Y := (1.0 - Size_Y) / 2.0; else Size_X := View_Ratio / Win_Ratio; Pos_X := (1.0 - Size_X) / 2.0; end if; return (Pos_X, Pos_Y, Size_X, Size_Y); end Viewport; -------------- -- Set_View -- -------------- procedure Set_View (View : Sf.Graphics.sfView_Ptr; Port : Sf.Graphics.Rect.sfFloatRect) is begin setViewport (View, Port); end Set_View; ---------------------------- -- Screenshot_From_Window -- ---------------------------- procedure Screenshot_From_Window (Window : sfRenderWindow_Ptr; Path : String) is Size : constant Sf.System.Vector2.sfVector2u := Sf.Graphics.RenderWindow.getSize (Window); Tex : constant Sf.Graphics.sfTexture_Ptr := Sf.Graphics.Texture.create (Size.x, Size.y); Img : Sf.Graphics.sfImage_Ptr; begin Sf.Graphics.Texture.updateFromRenderWindow (Tex, Window, 0, 0); Img := Sf.Graphics.Texture.copyToImage (Tex); if not Sf.Graphics.Image.saveToFile (Img, Path) then raise Program_Error with "Cannot save screenshot..."; end if; Sf.Graphics.Image.destroy (Img); Sf.Graphics.Texture.destroy (Tex); end Screenshot_From_Window; task Periodic_Update is entry Start; entry Take_Screenshot (Path : String); end Periodic_Update; --------------------- -- Periodic_Update -- --------------------- task body Periodic_Update is BG_Width : constant := Screen_Width; BG_Height : constant := Screen_Height; Mode : constant Sf.Window.VideoMode.sfVideoMode := (BG_Width, BG_Height, 32); Params : constant sfContextSettings := sfDefaultContextSettings; Window : Sf.Graphics.sfRenderWindow_Ptr; Framebuffer_Texture : Sf.Graphics.sfTexture_Ptr; Render_Texture : Sf.Graphics.sfRenderTexture_Ptr; Screen_Sprite : Sf.Graphics.sfSprite_Ptr; Sprite_Right : Sf.Graphics.sfSprite_Ptr; Letter_Box_View : Sf.Graphics.sfView_Ptr; Event : sfEvent; Period : constant Time_Span := Milliseconds (1000 / Refresh_Rate); Next_Release : Time := Clock + Period; Screen_Scale : constant := 1.0; -- 296.0 / Float (Screen_Width); Screen_Offset : constant sfVector2f := (0.0, 0.0); begin accept Start; Framebuffer_Texture := create (Screen_Width, Screen_Height); if Framebuffer_Texture = null then Put_Line ("Failed to create screen texture"); GNAT.OS_Lib.OS_Exit (1); end if; Render_Texture := create (Screen_Width, Screen_Height, False); if Render_Texture = null then Put_Line ("Could not create render texture"); GNAT.OS_Lib.OS_Exit (1); end if; Screen_Sprite := create; if Screen_Sprite = null then Put_Line ("Could not create screen sprite"); GNAT.OS_Lib.OS_Exit (1); end if; setTexture (Screen_Sprite, getTexture (Render_Texture)); scale (Screen_Sprite, (Screen_Scale, Screen_Scale)); setPosition (Screen_Sprite, Screen_Offset); Sprite_Right := create; if Sprite_Right = null then Put_Line ("Could not create sprite"); GNAT.OS_Lib.OS_Exit (1); end if; setTexture (Sprite_Right, Framebuffer_Texture); Window := create (Mode, Ada.Strings.Unbounded.To_String (Title), sfResize or sfClose, Params); if Window = null then Put_Line ("Failed to create window"); GNAT.OS_Lib.OS_Exit (1); end if; setVerticalSyncEnabled (Window, sfFalse); setVisible (Window, sfTrue); Letter_Box_View := create; if Letter_Box_View = null then Put_Line ("Failed to create view"); GNAT.OS_Lib.OS_Exit (1); end if; setSize (Letter_Box_View, (Float (BG_Width), Float (BG_Height))); setCenter (Letter_Box_View, (Float (BG_Width) / 2.0, Float (BG_Height) / 2.0)); Win_Width := getSize (Window).x; Win_Height := getSize (Window).y; Port := Viewport (Letter_Box_View, Win_Width, Win_Height); Set_View (Letter_Box_View, Port); loop delay until Next_Release; Next_Release := Next_Release + Period; while pollEvent (Window, Event) loop case Event.eventType is when sfEvtClosed => close (Window); Put_Line ("Attempting to close"); GNAT.OS_Lib.OS_Exit (0); when sfEvtResized => Win_Width := getSize (Window).x; Win_Height := getSize (Window).y; Port := Viewport (Letter_Box_View, Win_Width, Win_Height); Set_View (Letter_Box_View, Port); when sfEvtMouseMoved => In_Pointer_Pos := (Int16_T (Event.mouseMove.x), Int16_T (Event.mouseMove.y)); if Pointer_Enabled then Pointer_Queue.Push ((Union => (Discr => 0, Point => In_Pointer_Pos), User_Data => System.Null_Address, State => In_Pointer_State)); end if; when sfEvtMouseButtonPressed => if Event.mouseButton.button = sfMouseLeft then In_Pointer_State := Lv.Hal.Indev.State_Pr; if Pointer_Enabled then Pointer_Queue.Push ((Union => (Discr => 0, Point => In_Pointer_Pos), User_Data => System.Null_Address, State => In_Pointer_State)); end if; end if; when sfEvtMouseButtonReleased => if Event.mouseButton.button = sfMouseLeft then In_Pointer_State := Lv.Hal.Indev.State_Rel; if Pointer_Enabled then Pointer_Queue.Push ((Union => (Discr => 0, Point => In_Pointer_Pos), User_Data => System.Null_Address, State => In_Pointer_State)); end if; end if; when sfEvtKeyPressed | sfEvtKeyReleased => if Keypad_Enabled then Keypad_Queue.Push ((Union => (Discr => 1, Key => To_LVGL_Code (Event.key)), User_Data => System.Null_Address, State => (if Event.eventType = sfEvtKeyPressed then Lv.Hal.Indev.State_Pr else Lv.Hal.Indev.State_Rel))); end if; when others => null; end case; end loop; updateFromPixels (texture => Framebuffer_Texture, pixels => Frame_Buffer (Frame_Buffer'First)'Access, width => Screen_Width, height => Screen_Height, x => 0, y => 0); setPosition (Sprite_Right, (0.0, 0.0)); drawSprite (Render_Texture, Sprite_Right); display (Render_Texture); clear (Window); drawSprite (Window, Screen_Sprite); select accept Take_Screenshot (Path : String) do Screenshot_From_Window (Window, Path); end Take_Screenshot; else null; end select; setView (Window, Letter_Box_View); display (Window); end loop; exception when E : others => Put_Line (Ada.Exceptions.Exception_Message (E)); GNAT.OS_Lib.OS_Exit (1); end Periodic_Update; ----------- -- Start -- ----------- procedure Start (Title : String; Refresh_Rate : Positive) is begin LVGL_Ada_Simulator.Title := Ada.Strings.Unbounded.To_Unbounded_String (Title); LVGL_Ada_Simulator.Refresh_Rate := Refresh_Rate; Periodic_Update.Start; Lv.Hal.Disp.Init_Drv (LV_Disp_Drv'Access); LV_Disp_Drv.Disp_Flush := Disp_Flush'Access; LV_Disp_Drv.Disp_Fill := Disp_Fill'Access; LV_Disp_Drv.Disp_Map := Disp_Map'Access; LV_Disp := Lv.Hal.Disp.Register (LV_Disp_Drv'Access); Lv.Hal.Disp.Set_Active (LV_Disp); end Start; ---------------- -- Add_Cursor -- ---------------- procedure Add_Pointer (With_Cursor : Boolean := False) is Mouse_Cursor_Icon : Integer; pragma Import (C, Mouse_Cursor_Icon, "lvgl_ada_sim_mouse_cursor_icon"); begin Lv.Hal.Indev.Init_Drv (LV_Indev_Pointer_Drv'Access); LV_Indev_Pointer_Drv.Read := Read_Pointer'Access; LV_Indev_Pointer_Drv.C_Type := Lv.Hal.Indev.Type_Pointer; LV_Indev_Pointer := Lv.Hal.Indev.Register (LV_Indev_Pointer_Drv'Access); if With_Cursor then Cursor_Obj := Lv.Objx.Img.Create (Lv.Objx.Scr_Act, Lv.Objx.No_Obj); Lv.Objx.Img.Set_Src (Cursor_Obj, Mouse_Cursor_Icon'Address); Lv.Indev.Set_Cursor (LV_Indev_Pointer, Cursor_Obj); end if; Pointer_Enabled := True; end Add_Pointer; ------------------ -- Add_Keyboard -- ------------------ procedure Add_Keyboard is begin Lv.Hal.Indev.Init_Drv (LV_Indev_Keypad_Drv'Access); LV_Indev_Keypad_Drv.Read := Read_Keypad'Access; LV_Indev_Keypad_Drv.C_Type := Lv.Hal.Indev.Type_Keypad; LV_Indev_Keypad := Lv.Hal.Indev.Register (LV_Indev_Keypad_Drv'Access); Keypad_Enabled := True; end Add_Keyboard; -------------------- -- Keyboard_Indev -- -------------------- function Keyboard_Indev return Lv.Hal.Indev.Indev_T is (LV_Indev_Keypad); --------------------- -- Take_Screenshot -- --------------------- procedure Take_Screenshot (Path : String) is begin Periodic_Update.Take_Screenshot (Path); end Take_Screenshot; ------------------ -- Read_Pointer -- ------------------ function Read_Pointer (Data : access Indev_Data_T) return U_Bool is Left : constant Int16_T := Int16_T (Port.left * Float (Win_Width)); Top : constant Int16_T := Int16_T (Port.top * Float (Win_Height)); Width : constant Int16_T := Int16_T (Port.width * Float (Win_Width)); Height : constant Int16_T := Int16_T (Port.height * Float (Win_Height)); LV_Screen_Ratio_Y : constant Float := Float (Screen_Height) / Float (Win_Height); LV_Screen_Ratio_X : constant Float := Float (Screen_Width) / Float (Win_Width); Evt_In : Indev_Data_T; Scaled : Lv.Area.Point_T; Success : Boolean; begin Pointer_Queue.Pop (Evt_In, Success); if Success then Out_Pointer_Pos := Evt_In.Union.Point; Out_Pointer_State := Evt_In.State; end if; Scaled := Out_Pointer_Pos; Data.State := Out_Pointer_State; if Scaled.X < Left then Scaled.X := 0; else Scaled.X := Scaled.X - Left; end if; if Scaled.Y < Top then Scaled.Y := 0; else Scaled.Y := Scaled.Y - Top; end if; Scaled.X := Int16_T (Float (Scaled.X) * LV_Screen_Ratio_X / Port.width); Scaled.Y := Int16_T (Float (Scaled.Y) * LV_Screen_Ratio_Y/ Port.height); Data.Union.Point := Scaled; return (if Success then 1 else 0); end Read_Pointer; ----------------- -- Read_Keypad -- ----------------- function Read_Keypad (Data : access Indev_Data_T) return U_Bool is Success : Boolean; begin Keypad_Queue.Pop (Data.all, Success); return (if Success then 1 else 0); end Read_Keypad; ---------------- -- Disp_Flush -- ---------------- procedure Disp_Flush (X1 : Int32_T; Y1 : Int32_T; X2 : Int32_T; Y2 : Int32_T; Color : access constant Color_Array) is begin if X2 < 0 or else Y2 < 0 or else X1 > Int32_T (Screen_Width - 1) or else Y1 > Int32_T (Screen_Height - 1) then Lv.Vdb.Flush_Ready; return; end if; declare FB : array (Int32_T range 0 .. (Screen_Width * Screen_Height) - 1) of Uint32_T with Address => Frame_Buffer'Address; Index : Natural := Color'First; begin for Y in Y1 .. Y2 loop for X in X1 .. X2 loop FB (Y * Screen_Width + X) := Lv.Color.Color_To32 (Color (Index)); Index := Index + 1; end loop; end loop; end; Lv.Vdb.Flush_Ready; end Disp_Flush; --------------- -- Disp_Fill -- --------------- procedure Disp_Fill (X1 : Int32_T; Y1 : Int32_T; X2 : Int32_T; Y2 : Int32_T; Color : Lv.Color.Color_T) is C : constant Uint32_T := Lv.Color.Color_To32 (Color); begin if X2 < 0 or else Y2 < 0 or else X1 > Int32_T (Screen_Width - 1) or else Y1 > Int32_T (Screen_Height - 1) then Lv.Vdb.Flush_Ready; return; end if; declare FB : array (Int32_T range 0 .. (Screen_Width * Screen_Height) - 1) of Uint32_T with Address => Frame_Buffer'Address; begin for Y in Y1 .. Y2 loop for X in X1 .. X2 loop FB (Y * Screen_Width + X) := C; end loop; end loop; end; Lv.Vdb.Flush_Ready; end Disp_Fill; -------------- -- Disp_Map -- -------------- procedure Disp_Map (X1 : Int32_T; Y1 : Int32_T; X2 : Int32_T; Y2 : Int32_T; Color : access constant Color_Array) is begin -- Put_Line ("Disp_Map"); -- Ada.Text_IO.Put_Line ("X1:" & X1'Img); -- Ada.Text_IO.Put_Line ("Y1:" & Y1'Img); -- Ada.Text_IO.Put_Line ("X2:" & X2'Img); -- Ada.Text_IO.Put_Line ("Y2:" & Y2'Img); -- Ada.Text_IO.Put_Line ("Length:" & Color'Length'Img); -- Ada.Text_IO.Put_Line ("First:" & Color'First'Img); null; end Disp_Map; end LVGL_Ada_Simulator;
Maxelweb/concurrency-sandbox
Ada
27,365
ads
pragma Warnings (Off); pragma Ada_95; with System; with System.Parameters; with System.Secondary_Stack; package ada_main is gnat_argc : Integer; gnat_argv : System.Address; gnat_envp : System.Address; pragma Import (C, gnat_argc); pragma Import (C, gnat_argv); pragma Import (C, gnat_envp); gnat_exit_status : Integer; pragma Import (C, gnat_exit_status); GNAT_Version : constant String := "GNAT Version: 10.2.0" & ASCII.NUL; pragma Export (C, GNAT_Version, "__gnat_version"); Ada_Main_Program_Name : constant String := "_ada_main" & ASCII.NUL; pragma Export (C, Ada_Main_Program_Name, "__gnat_ada_main_program_name"); procedure adainit; pragma Export (C, adainit, "adainit"); procedure adafinal; pragma Export (C, adafinal, "adafinal"); function main (argc : Integer; argv : System.Address; envp : System.Address) return Integer; pragma Export (C, main, "main"); type Version_32 is mod 2 ** 32; u00001 : constant Version_32 := 16#f01b4674#; pragma Export (C, u00001, "mainB"); u00002 : constant Version_32 := 16#050ff2f0#; pragma Export (C, u00002, "system__standard_libraryB"); u00003 : constant Version_32 := 16#4113f22b#; pragma Export (C, u00003, "system__standard_libraryS"); u00004 : constant Version_32 := 16#76789da1#; pragma Export (C, u00004, "adaS"); u00005 : constant Version_32 := 16#185015e7#; pragma Export (C, u00005, "ada__exceptionsB"); u00006 : constant Version_32 := 16#d6578bab#; pragma Export (C, u00006, "ada__exceptionsS"); u00007 : constant Version_32 := 16#5726abed#; pragma Export (C, u00007, "ada__exceptions__last_chance_handlerB"); u00008 : constant Version_32 := 16#cfec26ee#; pragma Export (C, u00008, "ada__exceptions__last_chance_handlerS"); u00009 : constant Version_32 := 16#4635ec04#; pragma Export (C, u00009, "systemS"); u00010 : constant Version_32 := 16#ae860117#; pragma Export (C, u00010, "system__soft_linksB"); u00011 : constant Version_32 := 16#8d3f9472#; pragma Export (C, u00011, "system__soft_linksS"); u00012 : constant Version_32 := 16#f32b4133#; pragma Export (C, u00012, "system__secondary_stackB"); u00013 : constant Version_32 := 16#03a1141d#; pragma Export (C, u00013, "system__secondary_stackS"); u00014 : constant Version_32 := 16#86dbf443#; pragma Export (C, u00014, "system__parametersB"); u00015 : constant Version_32 := 16#0ed9b82f#; pragma Export (C, u00015, "system__parametersS"); u00016 : constant Version_32 := 16#ced09590#; pragma Export (C, u00016, "system__storage_elementsB"); u00017 : constant Version_32 := 16#6bf6a600#; pragma Export (C, u00017, "system__storage_elementsS"); u00018 : constant Version_32 := 16#75bf515c#; pragma Export (C, u00018, "system__soft_links__initializeB"); u00019 : constant Version_32 := 16#5697fc2b#; pragma Export (C, u00019, "system__soft_links__initializeS"); u00020 : constant Version_32 := 16#41837d1e#; pragma Export (C, u00020, "system__stack_checkingB"); u00021 : constant Version_32 := 16#c88a87ec#; pragma Export (C, u00021, "system__stack_checkingS"); u00022 : constant Version_32 := 16#34742901#; pragma Export (C, u00022, "system__exception_tableB"); u00023 : constant Version_32 := 16#1b9b8546#; pragma Export (C, u00023, "system__exception_tableS"); u00024 : constant Version_32 := 16#ce4af020#; pragma Export (C, u00024, "system__exceptionsB"); u00025 : constant Version_32 := 16#2e5681f2#; pragma Export (C, u00025, "system__exceptionsS"); u00026 : constant Version_32 := 16#69416224#; pragma Export (C, u00026, "system__exceptions__machineB"); u00027 : constant Version_32 := 16#5c74e542#; pragma Export (C, u00027, "system__exceptions__machineS"); u00028 : constant Version_32 := 16#aa0563fc#; pragma Export (C, u00028, "system__exceptions_debugB"); u00029 : constant Version_32 := 16#38bf15c0#; pragma Export (C, u00029, "system__exceptions_debugS"); u00030 : constant Version_32 := 16#6c2f8802#; pragma Export (C, u00030, "system__img_intB"); u00031 : constant Version_32 := 16#44ee0cc6#; pragma Export (C, u00031, "system__img_intS"); u00032 : constant Version_32 := 16#39df8c17#; pragma Export (C, u00032, "system__tracebackB"); u00033 : constant Version_32 := 16#181732c0#; pragma Export (C, u00033, "system__tracebackS"); u00034 : constant Version_32 := 16#9ed49525#; pragma Export (C, u00034, "system__traceback_entriesB"); u00035 : constant Version_32 := 16#466e1a74#; pragma Export (C, u00035, "system__traceback_entriesS"); u00036 : constant Version_32 := 16#448e9548#; pragma Export (C, u00036, "system__traceback__symbolicB"); u00037 : constant Version_32 := 16#46491211#; pragma Export (C, u00037, "system__traceback__symbolicS"); u00038 : constant Version_32 := 16#179d7d28#; pragma Export (C, u00038, "ada__containersS"); u00039 : constant Version_32 := 16#701f9d88#; pragma Export (C, u00039, "ada__exceptions__tracebackB"); u00040 : constant Version_32 := 16#ae2d2db5#; pragma Export (C, u00040, "ada__exceptions__tracebackS"); u00041 : constant Version_32 := 16#5ab55268#; pragma Export (C, u00041, "interfacesS"); u00042 : constant Version_32 := 16#769e25e6#; pragma Export (C, u00042, "interfaces__cB"); u00043 : constant Version_32 := 16#467817d8#; pragma Export (C, u00043, "interfaces__cS"); u00044 : constant Version_32 := 16#e865e681#; pragma Export (C, u00044, "system__bounded_stringsB"); u00045 : constant Version_32 := 16#31c8cd1d#; pragma Export (C, u00045, "system__bounded_stringsS"); u00046 : constant Version_32 := 16#0062635e#; pragma Export (C, u00046, "system__crtlS"); u00047 : constant Version_32 := 16#bba79bcb#; pragma Export (C, u00047, "system__dwarf_linesB"); u00048 : constant Version_32 := 16#9a78d181#; pragma Export (C, u00048, "system__dwarf_linesS"); u00049 : constant Version_32 := 16#5b4659fa#; pragma Export (C, u00049, "ada__charactersS"); u00050 : constant Version_32 := 16#8f637df8#; pragma Export (C, u00050, "ada__characters__handlingB"); u00051 : constant Version_32 := 16#3b3f6154#; pragma Export (C, u00051, "ada__characters__handlingS"); u00052 : constant Version_32 := 16#4b7bb96a#; pragma Export (C, u00052, "ada__characters__latin_1S"); u00053 : constant Version_32 := 16#e6d4fa36#; pragma Export (C, u00053, "ada__stringsS"); u00054 : constant Version_32 := 16#96df1a3f#; pragma Export (C, u00054, "ada__strings__mapsB"); u00055 : constant Version_32 := 16#1e526bec#; pragma Export (C, u00055, "ada__strings__mapsS"); u00056 : constant Version_32 := 16#5886cb31#; pragma Export (C, u00056, "system__bit_opsB"); u00057 : constant Version_32 := 16#0765e3a3#; pragma Export (C, u00057, "system__bit_opsS"); u00058 : constant Version_32 := 16#72b39087#; pragma Export (C, u00058, "system__unsigned_typesS"); u00059 : constant Version_32 := 16#92f05f13#; pragma Export (C, u00059, "ada__strings__maps__constantsS"); u00060 : constant Version_32 := 16#a0d3d22b#; pragma Export (C, u00060, "system__address_imageB"); u00061 : constant Version_32 := 16#e7d9713e#; pragma Export (C, u00061, "system__address_imageS"); u00062 : constant Version_32 := 16#ec78c2bf#; pragma Export (C, u00062, "system__img_unsB"); u00063 : constant Version_32 := 16#ed47ac70#; pragma Export (C, u00063, "system__img_unsS"); u00064 : constant Version_32 := 16#d7aac20c#; pragma Export (C, u00064, "system__ioB"); u00065 : constant Version_32 := 16#d8771b4b#; pragma Export (C, u00065, "system__ioS"); u00066 : constant Version_32 := 16#f790d1ef#; pragma Export (C, u00066, "system__mmapB"); u00067 : constant Version_32 := 16#7c445363#; pragma Export (C, u00067, "system__mmapS"); u00068 : constant Version_32 := 16#92d882c5#; pragma Export (C, u00068, "ada__io_exceptionsS"); u00069 : constant Version_32 := 16#91eaca2e#; pragma Export (C, u00069, "system__mmap__os_interfaceB"); u00070 : constant Version_32 := 16#1fc2f713#; pragma Export (C, u00070, "system__mmap__os_interfaceS"); u00071 : constant Version_32 := 16#1e7d913a#; pragma Export (C, u00071, "system__mmap__unixS"); u00072 : constant Version_32 := 16#54420b60#; pragma Export (C, u00072, "system__os_libB"); u00073 : constant Version_32 := 16#d872da39#; pragma Export (C, u00073, "system__os_libS"); u00074 : constant Version_32 := 16#ec4d5631#; pragma Export (C, u00074, "system__case_utilB"); u00075 : constant Version_32 := 16#79e05a50#; pragma Export (C, u00075, "system__case_utilS"); u00076 : constant Version_32 := 16#2a8e89ad#; pragma Export (C, u00076, "system__stringsB"); u00077 : constant Version_32 := 16#2623c091#; pragma Export (C, u00077, "system__stringsS"); u00078 : constant Version_32 := 16#5a3f5337#; pragma Export (C, u00078, "system__object_readerB"); u00079 : constant Version_32 := 16#82413105#; pragma Export (C, u00079, "system__object_readerS"); u00080 : constant Version_32 := 16#fb020d94#; pragma Export (C, u00080, "system__val_lliB"); u00081 : constant Version_32 := 16#2a5b7ef4#; pragma Export (C, u00081, "system__val_lliS"); u00082 : constant Version_32 := 16#b8e72903#; pragma Export (C, u00082, "system__val_lluB"); u00083 : constant Version_32 := 16#1f7d1d65#; pragma Export (C, u00083, "system__val_lluS"); u00084 : constant Version_32 := 16#269742a9#; pragma Export (C, u00084, "system__val_utilB"); u00085 : constant Version_32 := 16#ea955afa#; pragma Export (C, u00085, "system__val_utilS"); u00086 : constant Version_32 := 16#d7bf3f29#; pragma Export (C, u00086, "system__exception_tracesB"); u00087 : constant Version_32 := 16#62eacc9e#; pragma Export (C, u00087, "system__exception_tracesS"); u00088 : constant Version_32 := 16#8c33a517#; pragma Export (C, u00088, "system__wch_conB"); u00089 : constant Version_32 := 16#5d48ced6#; pragma Export (C, u00089, "system__wch_conS"); u00090 : constant Version_32 := 16#9721e840#; pragma Export (C, u00090, "system__wch_stwB"); u00091 : constant Version_32 := 16#7059e2d7#; pragma Export (C, u00091, "system__wch_stwS"); u00092 : constant Version_32 := 16#a831679c#; pragma Export (C, u00092, "system__wch_cnvB"); u00093 : constant Version_32 := 16#52ff7425#; pragma Export (C, u00093, "system__wch_cnvS"); u00094 : constant Version_32 := 16#ece6fdb6#; pragma Export (C, u00094, "system__wch_jisB"); u00095 : constant Version_32 := 16#d28f6d04#; pragma Export (C, u00095, "system__wch_jisS"); u00096 : constant Version_32 := 16#f64b89a4#; pragma Export (C, u00096, "ada__integer_text_ioB"); u00097 : constant Version_32 := 16#2ec7c168#; pragma Export (C, u00097, "ada__integer_text_ioS"); u00098 : constant Version_32 := 16#f4e097a7#; pragma Export (C, u00098, "ada__text_ioB"); u00099 : constant Version_32 := 16#777d5329#; pragma Export (C, u00099, "ada__text_ioS"); u00100 : constant Version_32 := 16#10558b11#; pragma Export (C, u00100, "ada__streamsB"); u00101 : constant Version_32 := 16#67e31212#; pragma Export (C, u00101, "ada__streamsS"); u00102 : constant Version_32 := 16#5d91da9f#; pragma Export (C, u00102, "ada__tagsB"); u00103 : constant Version_32 := 16#12a0afb8#; pragma Export (C, u00103, "ada__tagsS"); u00104 : constant Version_32 := 16#796f31f1#; pragma Export (C, u00104, "system__htableB"); u00105 : constant Version_32 := 16#c2f75fee#; pragma Export (C, u00105, "system__htableS"); u00106 : constant Version_32 := 16#089f5cd0#; pragma Export (C, u00106, "system__string_hashB"); u00107 : constant Version_32 := 16#60a93490#; pragma Export (C, u00107, "system__string_hashS"); u00108 : constant Version_32 := 16#73d2d764#; pragma Export (C, u00108, "interfaces__c_streamsB"); u00109 : constant Version_32 := 16#b1330297#; pragma Export (C, u00109, "interfaces__c_streamsS"); u00110 : constant Version_32 := 16#ec9c64c3#; pragma Export (C, u00110, "system__file_ioB"); u00111 : constant Version_32 := 16#e1440d61#; pragma Export (C, u00111, "system__file_ioS"); u00112 : constant Version_32 := 16#86c56e5a#; pragma Export (C, u00112, "ada__finalizationS"); u00113 : constant Version_32 := 16#95817ed8#; pragma Export (C, u00113, "system__finalization_rootB"); u00114 : constant Version_32 := 16#09c79f94#; pragma Export (C, u00114, "system__finalization_rootS"); u00115 : constant Version_32 := 16#bbaa76ac#; pragma Export (C, u00115, "system__file_control_blockS"); u00116 : constant Version_32 := 16#fdedfd10#; pragma Export (C, u00116, "ada__text_io__integer_auxB"); u00117 : constant Version_32 := 16#2fe01d89#; pragma Export (C, u00117, "ada__text_io__integer_auxS"); u00118 : constant Version_32 := 16#181dc502#; pragma Export (C, u00118, "ada__text_io__generic_auxB"); u00119 : constant Version_32 := 16#305a076a#; pragma Export (C, u00119, "ada__text_io__generic_auxS"); u00120 : constant Version_32 := 16#b10ba0c7#; pragma Export (C, u00120, "system__img_biuB"); u00121 : constant Version_32 := 16#b49118ca#; pragma Export (C, u00121, "system__img_biuS"); u00122 : constant Version_32 := 16#4e06ab0c#; pragma Export (C, u00122, "system__img_llbB"); u00123 : constant Version_32 := 16#f5560834#; pragma Export (C, u00123, "system__img_llbS"); u00124 : constant Version_32 := 16#9dca6636#; pragma Export (C, u00124, "system__img_lliB"); u00125 : constant Version_32 := 16#577ab9d5#; pragma Export (C, u00125, "system__img_lliS"); u00126 : constant Version_32 := 16#a756d097#; pragma Export (C, u00126, "system__img_llwB"); u00127 : constant Version_32 := 16#5c3a2ba2#; pragma Export (C, u00127, "system__img_llwS"); u00128 : constant Version_32 := 16#eb55dfbb#; pragma Export (C, u00128, "system__img_wiuB"); u00129 : constant Version_32 := 16#dad09f58#; pragma Export (C, u00129, "system__img_wiuS"); u00130 : constant Version_32 := 16#0f9783a4#; pragma Export (C, u00130, "system__val_intB"); u00131 : constant Version_32 := 16#f3ca8567#; pragma Export (C, u00131, "system__val_intS"); u00132 : constant Version_32 := 16#383fd226#; pragma Export (C, u00132, "system__val_unsB"); u00133 : constant Version_32 := 16#47b5ed3e#; pragma Export (C, u00133, "system__val_unsS"); u00134 : constant Version_32 := 16#7c767b3e#; pragma Export (C, u00134, "soeB"); u00135 : constant Version_32 := 16#93d61ca8#; pragma Export (C, u00135, "soeS"); u00136 : constant Version_32 := 16#357666d8#; pragma Export (C, u00136, "ada__calendar__delaysB"); u00137 : constant Version_32 := 16#d86d2f1d#; pragma Export (C, u00137, "ada__calendar__delaysS"); u00138 : constant Version_32 := 16#fc54e290#; pragma Export (C, u00138, "ada__calendarB"); u00139 : constant Version_32 := 16#31350a81#; pragma Export (C, u00139, "ada__calendarS"); u00140 : constant Version_32 := 16#51f2d040#; pragma Export (C, u00140, "system__os_primitivesB"); u00141 : constant Version_32 := 16#41c889f2#; pragma Export (C, u00141, "system__os_primitivesS"); u00142 : constant Version_32 := 16#2b70b149#; pragma Export (C, u00142, "system__concat_3B"); u00143 : constant Version_32 := 16#4d45b0a1#; pragma Export (C, u00143, "system__concat_3S"); u00144 : constant Version_32 := 16#fd83e873#; pragma Export (C, u00144, "system__concat_2B"); u00145 : constant Version_32 := 16#44953bd4#; pragma Export (C, u00145, "system__concat_2S"); u00146 : constant Version_32 := 16#932a4690#; pragma Export (C, u00146, "system__concat_4B"); u00147 : constant Version_32 := 16#3851c724#; pragma Export (C, u00147, "system__concat_4S"); u00148 : constant Version_32 := 16#c2216981#; pragma Export (C, u00148, "system__taskingB"); u00149 : constant Version_32 := 16#5f56b18c#; pragma Export (C, u00149, "system__taskingS"); u00150 : constant Version_32 := 16#0894e9be#; pragma Export (C, u00150, "system__task_primitivesS"); u00151 : constant Version_32 := 16#c9728a70#; pragma Export (C, u00151, "system__os_interfaceB"); u00152 : constant Version_32 := 16#668bffb5#; pragma Export (C, u00152, "system__os_interfaceS"); u00153 : constant Version_32 := 16#ff1f7771#; pragma Export (C, u00153, "system__linuxS"); u00154 : constant Version_32 := 16#3fb09703#; pragma Export (C, u00154, "system__os_constantsS"); u00155 : constant Version_32 := 16#88b9bc12#; pragma Export (C, u00155, "system__task_primitives__operationsB"); u00156 : constant Version_32 := 16#a249a2c5#; pragma Export (C, u00156, "system__task_primitives__operationsS"); u00157 : constant Version_32 := 16#71c5de81#; pragma Export (C, u00157, "system__interrupt_managementB"); u00158 : constant Version_32 := 16#ef0526ae#; pragma Export (C, u00158, "system__interrupt_managementS"); u00159 : constant Version_32 := 16#f65595cf#; pragma Export (C, u00159, "system__multiprocessorsB"); u00160 : constant Version_32 := 16#7e997377#; pragma Export (C, u00160, "system__multiprocessorsS"); u00161 : constant Version_32 := 16#375a3ef7#; pragma Export (C, u00161, "system__task_infoB"); u00162 : constant Version_32 := 16#d7a1ab61#; pragma Export (C, u00162, "system__task_infoS"); u00163 : constant Version_32 := 16#f0965c7b#; pragma Export (C, u00163, "system__tasking__debugB"); u00164 : constant Version_32 := 16#6502a0c1#; pragma Export (C, u00164, "system__tasking__debugS"); u00165 : constant Version_32 := 16#b31a5821#; pragma Export (C, u00165, "system__img_enum_newB"); u00166 : constant Version_32 := 16#2779eac4#; pragma Export (C, u00166, "system__img_enum_newS"); u00167 : constant Version_32 := 16#6ec3c867#; pragma Export (C, u00167, "system__stack_usageB"); u00168 : constant Version_32 := 16#3a3ac346#; pragma Export (C, u00168, "system__stack_usageS"); u00169 : constant Version_32 := 16#9322406a#; pragma Export (C, u00169, "system__tasking__rendezvousB"); u00170 : constant Version_32 := 16#d811d710#; pragma Export (C, u00170, "system__tasking__rendezvousS"); u00171 : constant Version_32 := 16#100eaf58#; pragma Export (C, u00171, "system__restrictionsB"); u00172 : constant Version_32 := 16#0d473555#; pragma Export (C, u00172, "system__restrictionsS"); u00173 : constant Version_32 := 16#69bd1289#; pragma Export (C, u00173, "system__tasking__entry_callsB"); u00174 : constant Version_32 := 16#6342024e#; pragma Export (C, u00174, "system__tasking__entry_callsS"); u00175 : constant Version_32 := 16#4e315ff7#; pragma Export (C, u00175, "system__tasking__initializationB"); u00176 : constant Version_32 := 16#fc2303e6#; pragma Export (C, u00176, "system__tasking__initializationS"); u00177 : constant Version_32 := 16#55e88911#; pragma Export (C, u00177, "system__soft_links__taskingB"); u00178 : constant Version_32 := 16#e939497e#; pragma Export (C, u00178, "system__soft_links__taskingS"); u00179 : constant Version_32 := 16#3880736e#; pragma Export (C, u00179, "ada__exceptions__is_null_occurrenceB"); u00180 : constant Version_32 := 16#6fde25af#; pragma Export (C, u00180, "ada__exceptions__is_null_occurrenceS"); u00181 : constant Version_32 := 16#263e126a#; pragma Export (C, u00181, "system__tasking__task_attributesB"); u00182 : constant Version_32 := 16#4c97674c#; pragma Export (C, u00182, "system__tasking__task_attributesS"); u00183 : constant Version_32 := 16#7f6ff536#; pragma Export (C, u00183, "system__tasking__protected_objectsB"); u00184 : constant Version_32 := 16#15001baf#; pragma Export (C, u00184, "system__tasking__protected_objectsS"); u00185 : constant Version_32 := 16#726dd94b#; pragma Export (C, u00185, "system__tasking__protected_objects__entriesB"); u00186 : constant Version_32 := 16#7daf93e7#; pragma Export (C, u00186, "system__tasking__protected_objects__entriesS"); u00187 : constant Version_32 := 16#83c8fb63#; pragma Export (C, u00187, "system__tasking__protected_objects__operationsB"); u00188 : constant Version_32 := 16#343fde45#; pragma Export (C, u00188, "system__tasking__protected_objects__operationsS"); u00189 : constant Version_32 := 16#cee82bbd#; pragma Export (C, u00189, "system__tasking__queuingB"); u00190 : constant Version_32 := 16#6dba2805#; pragma Export (C, u00190, "system__tasking__queuingS"); u00191 : constant Version_32 := 16#eb894f1f#; pragma Export (C, u00191, "system__tasking__utilitiesB"); u00192 : constant Version_32 := 16#0f670827#; pragma Export (C, u00192, "system__tasking__utilitiesS"); u00193 : constant Version_32 := 16#0780a76b#; pragma Export (C, u00193, "system__tasking__stagesB"); u00194 : constant Version_32 := 16#14e0647c#; pragma Export (C, u00194, "system__tasking__stagesS"); u00195 : constant Version_32 := 16#e932e590#; pragma Export (C, u00195, "ada__real_timeB"); u00196 : constant Version_32 := 16#69ea8064#; pragma Export (C, u00196, "ada__real_timeS"); u00197 : constant Version_32 := 16#e31b7c4e#; pragma Export (C, u00197, "system__memoryB"); u00198 : constant Version_32 := 16#1f488a30#; pragma Export (C, u00198, "system__memoryS"); -- BEGIN ELABORATION ORDER -- ada%s -- ada.characters%s -- ada.characters.latin_1%s -- interfaces%s -- system%s -- system.img_enum_new%s -- system.img_enum_new%b -- system.img_int%s -- system.img_int%b -- system.img_lli%s -- system.img_lli%b -- system.io%s -- system.io%b -- system.os_primitives%s -- system.os_primitives%b -- system.parameters%s -- system.parameters%b -- system.crtl%s -- interfaces.c_streams%s -- interfaces.c_streams%b -- system.restrictions%s -- system.restrictions%b -- system.storage_elements%s -- system.storage_elements%b -- system.stack_checking%s -- system.stack_checking%b -- system.stack_usage%s -- system.stack_usage%b -- system.string_hash%s -- system.string_hash%b -- system.htable%s -- system.htable%b -- system.strings%s -- system.strings%b -- system.traceback_entries%s -- system.traceback_entries%b -- system.unsigned_types%s -- system.img_biu%s -- system.img_biu%b -- system.img_llb%s -- system.img_llb%b -- system.img_llw%s -- system.img_llw%b -- system.img_uns%s -- system.img_uns%b -- system.img_wiu%s -- system.img_wiu%b -- system.wch_con%s -- system.wch_con%b -- system.wch_jis%s -- system.wch_jis%b -- system.wch_cnv%s -- system.wch_cnv%b -- system.concat_2%s -- system.concat_2%b -- system.concat_3%s -- system.concat_3%b -- system.concat_4%s -- system.concat_4%b -- system.traceback%s -- system.traceback%b -- ada.characters.handling%s -- system.case_util%s -- system.os_lib%s -- system.secondary_stack%s -- system.standard_library%s -- ada.exceptions%s -- system.exceptions_debug%s -- system.exceptions_debug%b -- system.soft_links%s -- system.val_lli%s -- system.val_llu%s -- system.val_util%s -- system.val_util%b -- system.wch_stw%s -- system.wch_stw%b -- ada.exceptions.last_chance_handler%s -- ada.exceptions.last_chance_handler%b -- ada.exceptions.traceback%s -- ada.exceptions.traceback%b -- system.address_image%s -- system.address_image%b -- system.bit_ops%s -- system.bit_ops%b -- system.bounded_strings%s -- system.bounded_strings%b -- system.case_util%b -- system.exception_table%s -- system.exception_table%b -- ada.containers%s -- ada.io_exceptions%s -- ada.strings%s -- ada.strings.maps%s -- ada.strings.maps%b -- ada.strings.maps.constants%s -- interfaces.c%s -- interfaces.c%b -- system.exceptions%s -- system.exceptions%b -- system.exceptions.machine%s -- system.exceptions.machine%b -- ada.characters.handling%b -- system.exception_traces%s -- system.exception_traces%b -- system.memory%s -- system.memory%b -- system.mmap%s -- system.mmap.os_interface%s -- system.mmap%b -- system.mmap.unix%s -- system.mmap.os_interface%b -- system.object_reader%s -- system.object_reader%b -- system.dwarf_lines%s -- system.dwarf_lines%b -- system.os_lib%b -- system.secondary_stack%b -- system.soft_links.initialize%s -- system.soft_links.initialize%b -- system.soft_links%b -- system.standard_library%b -- system.traceback.symbolic%s -- system.traceback.symbolic%b -- ada.exceptions%b -- system.val_lli%b -- system.val_llu%b -- ada.exceptions.is_null_occurrence%s -- ada.exceptions.is_null_occurrence%b -- ada.tags%s -- ada.tags%b -- ada.streams%s -- ada.streams%b -- system.file_control_block%s -- system.finalization_root%s -- system.finalization_root%b -- ada.finalization%s -- system.file_io%s -- system.file_io%b -- system.linux%s -- system.multiprocessors%s -- system.multiprocessors%b -- system.os_constants%s -- system.os_interface%s -- system.os_interface%b -- system.task_info%s -- system.task_info%b -- system.task_primitives%s -- system.interrupt_management%s -- system.interrupt_management%b -- system.tasking%s -- system.task_primitives.operations%s -- system.tasking.debug%s -- system.tasking.debug%b -- system.task_primitives.operations%b -- system.tasking%b -- system.val_uns%s -- system.val_uns%b -- system.val_int%s -- system.val_int%b -- ada.calendar%s -- ada.calendar%b -- ada.calendar.delays%s -- ada.calendar.delays%b -- ada.real_time%s -- ada.real_time%b -- ada.text_io%s -- ada.text_io%b -- ada.text_io.generic_aux%s -- ada.text_io.generic_aux%b -- ada.text_io.integer_aux%s -- ada.text_io.integer_aux%b -- ada.integer_text_io%s -- ada.integer_text_io%b -- system.soft_links.tasking%s -- system.soft_links.tasking%b -- system.tasking.initialization%s -- system.tasking.task_attributes%s -- system.tasking.task_attributes%b -- system.tasking.initialization%b -- system.tasking.protected_objects%s -- system.tasking.protected_objects%b -- system.tasking.protected_objects.entries%s -- system.tasking.protected_objects.entries%b -- system.tasking.queuing%s -- system.tasking.queuing%b -- system.tasking.utilities%s -- system.tasking.utilities%b -- system.tasking.entry_calls%s -- system.tasking.rendezvous%s -- system.tasking.protected_objects.operations%s -- system.tasking.protected_objects.operations%b -- system.tasking.entry_calls%b -- system.tasking.rendezvous%b -- system.tasking.stages%s -- system.tasking.stages%b -- soe%s -- soe%b -- main%b -- END ELABORATION ORDER end ada_main;