repo_name
stringlengths 9
74
| language
stringclasses 1
value | length_bytes
int64 11
9.34M
| extension
stringclasses 2
values | content
stringlengths 11
9.34M
|
---|---|---|---|---|
zhmu/ananas | Ada | 7,665 | adb | -----------------------------------------------------------------------------
-- GNAT COMPILER COMPONENTS --
-- --
-- G N A T . R E W R I T E _ D A T A --
-- --
-- B o d y --
-- --
-- Copyright (C) 2014-2022, Free Software Foundation, Inc. --
-- --
-- GNAT is free software; you can redistribute it and/or modify it under --
-- terms of the GNU General Public License as published by the Free Soft- --
-- ware Foundation; either version 3, or (at your option) any later ver- --
-- sion. GNAT is distributed in the hope that it will be useful, but WITH- --
-- OUT ANY WARRANTY; without even the implied warranty of MERCHANTABILITY --
-- or FITNESS FOR A PARTICULAR PURPOSE. --
-- --
-- As a special exception under Section 7 of GPL version 3, you are granted --
-- additional permissions described in the GCC Runtime Library Exception, --
-- version 3.1, as published by the Free Software Foundation. --
-- --
-- You should have received a copy of the GNU General Public License and --
-- a copy of the GCC Runtime Library Exception along with this program; --
-- see the files COPYING3 and COPYING.RUNTIME respectively. If not, see --
-- <http://www.gnu.org/licenses/>. --
-- --
-- GNAT was originally developed by the GNAT team at New York University. --
-- Extensive contributions were provided by Ada Core Technologies Inc. --
-- --
------------------------------------------------------------------------------
with Ada.Unchecked_Conversion;
package body GNAT.Rewrite_Data is
use Ada;
subtype SEO is Stream_Element_Offset;
procedure Do_Output
(B : Buffer;
Data : Stream_Element_Array;
Output : not null access procedure (Data : Stream_Element_Array));
-- Do the actual output. This ensures that we properly send the data
-- through linked rewrite buffers if any.
------------
-- Create --
------------
function Create
(Pattern, Value : String;
Size : Stream_Element_Offset := 1_024) return Buffer
is
subtype SP is String (1 .. Pattern'Length);
subtype SEAP is Stream_Element_Array (1 .. Pattern'Length);
subtype SV is String (1 .. Value'Length);
subtype SEAV is Stream_Element_Array (1 .. Value'Length);
function To_SEAP is new Unchecked_Conversion (SP, SEAP);
function To_SEAV is new Unchecked_Conversion (SV, SEAV);
begin
-- Return result (can't be smaller than pattern)
return B : Buffer
(SEO'Max (Size, SEO (Pattern'Length)),
SEO (Pattern'Length),
SEO (Value'Length))
do
B.Pattern := To_SEAP (Pattern);
B.Value := To_SEAV (Value);
B.Pos_C := 0;
B.Pos_B := 0;
end return;
end Create;
---------------
-- Do_Output --
---------------
procedure Do_Output
(B : Buffer;
Data : Stream_Element_Array;
Output : not null access procedure (Data : Stream_Element_Array))
is
begin
if B.Next = null then
Output (Data);
else
Write (B.Next.all, Data, Output);
end if;
end Do_Output;
-----------
-- Flush --
-----------
procedure Flush
(B : in out Buffer;
Output : not null access procedure (Data : Stream_Element_Array))
is
begin
-- Flush output buffer
if B.Pos_B > 0 then
Do_Output (B, B.Buffer (1 .. B.Pos_B), Output);
end if;
-- Flush current buffer
if B.Pos_C > 0 then
Do_Output (B, B.Current (1 .. B.Pos_C), Output);
end if;
-- Flush linked buffer if any
if B.Next /= null then
Flush (B.Next.all, Output);
end if;
Reset (B);
end Flush;
----------
-- Link --
----------
procedure Link (From : in out Buffer; To : Buffer_Ref) is
begin
From.Next := To;
end Link;
-----------
-- Reset --
-----------
procedure Reset (B : in out Buffer) is
begin
B.Pos_B := 0;
B.Pos_C := 0;
if B.Next /= null then
Reset (B.Next.all);
end if;
end Reset;
-------------
-- Rewrite --
-------------
procedure Rewrite
(B : in out Buffer;
Input : not null access procedure
(Buffer : out Stream_Element_Array;
Last : out Stream_Element_Offset);
Output : not null access procedure (Data : Stream_Element_Array))
is
Buffer : Stream_Element_Array (1 .. B.Size);
Last : Stream_Element_Offset;
begin
Rewrite_All : loop
Input (Buffer, Last);
exit Rewrite_All when Last = 0;
Write (B, Buffer (1 .. Last), Output);
end loop Rewrite_All;
Flush (B, Output);
end Rewrite;
----------
-- Size --
----------
function Size (B : Buffer) return Natural is
begin
return Natural (B.Pos_B + B.Pos_C);
end Size;
-----------
-- Write --
-----------
procedure Write
(B : in out Buffer;
Data : Stream_Element_Array;
Output : not null access procedure (Data : Stream_Element_Array))
is
procedure Need_Space (Size : Stream_Element_Offset);
pragma Inline (Need_Space);
----------------
-- Need_Space --
----------------
procedure Need_Space (Size : Stream_Element_Offset) is
begin
if B.Pos_B + Size > B.Size then
Do_Output (B, B.Buffer (1 .. B.Pos_B), Output);
B.Pos_B := 0;
end if;
end Need_Space;
-- Start of processing for Write
begin
if B.Size_Pattern = 0 then
Do_Output (B, Data, Output);
else
for K in Data'Range loop
if Data (K) = B.Pattern (B.Pos_C + 1) then
-- Store possible start of a match
B.Pos_C := B.Pos_C + 1;
B.Current (B.Pos_C) := Data (K);
else
-- Not part of pattern, if a start of a match was found,
-- remove it.
if B.Pos_C /= 0 then
Need_Space (B.Pos_C);
B.Buffer (B.Pos_B + 1 .. B.Pos_B + B.Pos_C) :=
B.Current (1 .. B.Pos_C);
B.Pos_B := B.Pos_B + B.Pos_C;
B.Pos_C := 0;
end if;
Need_Space (1);
B.Pos_B := B.Pos_B + 1;
B.Buffer (B.Pos_B) := Data (K);
end if;
if B.Pos_C = B.Size_Pattern then
-- The pattern is found
Need_Space (B.Size_Value);
B.Buffer (B.Pos_B + 1 .. B.Pos_B + B.Size_Value) := B.Value;
B.Pos_C := 0;
B.Pos_B := B.Pos_B + B.Size_Value;
end if;
end loop;
end if;
end Write;
end GNAT.Rewrite_Data;
|
coopht/axmpp | Ada | 11,212 | ads | ------------------------------------------------------------------------------
-- --
-- AXMPP Project --
-- --
-- XMPP Library for Ada --
-- --
------------------------------------------------------------------------------
-- --
-- Copyright © 2011-2018, Alexander Basov <[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 Alexander Basov, 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;
with XMPP.Networks;
with XMPP.Stream_Handlers;
with XMPP.Raw_Handlers;
with XML.SAX.Attributes;
with XML.SAX.Content_Handlers;
with XML.SAX.DTD_Handlers;
with XML.SAX.Declaration_Handlers;
with XML.SAX.Entity_Resolvers;
with XML.SAX.Error_Handlers;
with XML.SAX.Lexical_Handlers;
with XML.SAX.Locators;
with XML.SAX.Parse_Exceptions;
with XML.SAX.Pretty_Writers;
with XML.SAX.Simple_Readers;
with XML.SAX.String_Output_Destinations;
with XMPP.IQS;
with XMPP.Challenges;
with XMPP.Objects;
with XMPP.Idle_Tasks;
package XMPP.Sessions is
procedure Initialize renames XMPP.Networks.Initialize;
-- This procedure should be called before use of Sessions
type XMPP_Session is limited
new XMPP.Networks.Notification
and XML.SAX.Content_Handlers.SAX_Content_Handler
and XML.SAX.Declaration_Handlers.SAX_Declaration_Handler
and XML.SAX.DTD_Handlers.SAX_DTD_Handler
and XML.SAX.Entity_Resolvers.SAX_Entity_Resolver
and XML.SAX.Error_Handlers.SAX_Error_Handler
and XML.SAX.Lexical_Handlers.SAX_Lexical_Handler with private;
type XMPP_Session_Access is access all XMPP_Session;
-- XMPP Session API
-- XXX : API which should be rewritten in proper place
procedure Bind_Resource (Self : not null access XMPP_Session;
Resource_Id : League.Strings.Universal_String
:= League.Strings.Empty_Universal_String);
-- Binds resourse with specified Resource ID.
procedure Close (Self : in out XMPP_Session);
-- Closes XMPP session. Application should use this function to end
-- data exchange with xmpp server
procedure Discover_Information (Self : in out XMPP_Session;
JID : League.Strings.Universal_String);
-- Sending request for getting disco#info
procedure Discover_Items (Self : in out XMPP_Session;
JID : League.Strings.Universal_String);
-- Sending request for getting disco#items
procedure Establish_IQ_Session (Self : not null access XMPP_Session);
-- Establish real XMPP Session.
procedure Join_Multi_User_Chat
(Self : in out XMPP_Session;
Room : League.Strings.Universal_String;
Server : League.Strings.Universal_String;
Nick_Name : League.Strings.Universal_String);
-- Enters to the multichat Room, on the Server with the specified Nick_Name
procedure Open (Self : not null access XMPP_Session);
-- Initiates XMPP session. Application should use this function to start
-- data exchange with xmpp server
procedure Request_Roster (Self : not null access XMPP_Session);
-- Requests roster from server
procedure Request_Version
(Self : not null access XMPP_Session;
XMPP_Entity : League.Strings.Universal_String);
-- Requests information about the software application
-- associated with an XMPP entity
procedure Set_JID (Self : in out XMPP_Session;
JID : League.Strings.Universal_String);
-- Sets jabber ID. JID should be set without hostname
procedure Send_Object (Self : not null access XMPP_Session;
Object : XMPP.Objects.XMPP_Object'Class);
-- Sends XMPP Object
procedure Set_Password (Self : in out XMPP_Session;
Password : League.Strings.Universal_String);
-- Sets passowrd for jabber account
procedure Set_Raw_Handler
(Self : XMPP_Session;
Handler : not null access XMPP.Raw_Handlers.XMPP_Raw_Handler)
is null;
-- If application whants recieve RAW XML data, it should set Raw_Handler
procedure Set_Resource (Self : not null access XMPP_Session;
Resource_Id : League.Strings.Universal_String);
-- Function sets resource name which will be binded when client
-- is connected to server.
procedure Set_Stream_Handler
(Self : not null access XMPP_Session;
Handler : not null access XMPP.Stream_Handlers.XMPP_Stream_Handler'Class);
-- Application must set stream handler for the axmpp library.
procedure Set_Host (Self : not null access XMPP_Session;
Host : League.Strings.Universal_String);
-- Sets xmpp server host
procedure Set_Port (Self : not null access XMPP_Session;
Port : Natural);
-- Sets xmpp server port
private
type XMPP_Session is limited new XMPP.Networks.Notification
and XML.SAX.Content_Handlers.SAX_Content_Handler
and XML.SAX.Declaration_Handlers.SAX_Declaration_Handler
and XML.SAX.DTD_Handlers.SAX_DTD_Handler
and XML.SAX.Entity_Resolvers.SAX_Entity_Resolver
and XML.SAX.Error_Handlers.SAX_Error_Handler
and XML.SAX.Lexical_Handlers.SAX_Lexical_Handler with
record
Session_Opened : Boolean := False;
Stream_Handler : XMPP.Stream_Handlers.XMPP_Stream_Handler_Access;
Locator : XML.SAX.Locators.SAX_Locator;
Tag : League.Strings.Universal_String;
Text : League.Strings.Universal_String;
Network : aliased XMPP.Networks.Network (XMPP_Session'Unchecked_Access);
Reader : aliased XML.SAX.Simple_Readers.Simple_Reader;
Writer : XML.SAX.Pretty_Writers.XML_Pretty_Writer;
Output :
aliased XML.SAX.String_Output_Destinations.String_Output_Destination;
Stack : XMPP.Objects.Object_Vectors.Vector;
Idle_Task : XMPP.Idle_Tasks.Reader_Task;
Authenticated : Boolean := False;
JID : League.Strings.Universal_String;
Password : League.Strings.Universal_String;
Host : League.Strings.Universal_String;
Port : Natural := 5222;
In_IQ_Mode : Boolean := False;
IQ_Header : XMPP.IQS.XMPP_IQ;
Resource_Id : League.Strings.Universal_String
:= League.Strings.To_Universal_String ("axmpp");
end record;
-- overriding from SAX.Reader
overriding procedure Characters
(Self : in out XMPP_Session;
Text : League.Strings.Universal_String;
Success : in out Boolean);
overriding procedure End_Element
(Self : in out XMPP_Session;
Namespace_URI : League.Strings.Universal_String;
Local_Name : League.Strings.Universal_String;
Qualified_Name : League.Strings.Universal_String;
Success : in out Boolean);
overriding function Error_String (Self : XMPP_Session)
return League.Strings.Universal_String;
overriding procedure Fatal_Error
(Self : in out XMPP_Session;
Occurrence : XML.SAX.Parse_Exceptions.SAX_Parse_Exception);
overriding procedure Start_Element
(Self : in out XMPP_Session;
Namespace_URI : League.Strings.Universal_String;
Local_Name : League.Strings.Universal_String;
Qualified_Name : League.Strings.Universal_String;
Attributes : XML.SAX.Attributes.SAX_Attributes;
Success : in out Boolean);
-- Overriding functions from XMPP_Network
overriding procedure On_Connect (Self : not null access XMPP_Session);
overriding procedure On_Disconnect (Self : not null access XMPP_Session);
overriding function Read_Data (Self : not null access XMPP_Session)
return Boolean;
-- Session private functions
function Is_Opened (Self : XMPP_Session) return Boolean;
procedure Open_Stream (Self : not null access XMPP_Session);
procedure Send_Wide_Wide_String (Self : in out XMPP_Session;
Str : Wide_Wide_String);
procedure Process_IQ (Self : in out XMPP_Session;
IQ : XMPP.Objects.XMPP_Object_Access);
-- IQ empty in case of result of session.
procedure Proceed_TLS_Auth (Self : not null access XMPP_Session);
procedure Proceed_SASL_Auth
(Self : not null access XMPP_Session;
Object : not null XMPP.Challenges.XMPP_Challenge_Access);
procedure Disconnect (Self : in out XMPP_Session);
end XMPP.Sessions;
|
Sejik/SignalAnalysis | Ada | 13,180 | adb | ----------------------------------------------------------------
-- ZLib for Ada thick binding. --
-- --
-- Copyright (C) 2002-2003 Dmitriy Anisimkov --
-- --
-- Open source license information is in the zlib.ads file. --
----------------------------------------------------------------
-- $Id: test.adb,v 1.2 2007/06/14 11:55:45 duncan Exp $
-- The program has a few aims.
-- 1. Test ZLib.Ada95 thick binding functionality.
-- 2. Show the example of use main functionality of the ZLib.Ada95 binding.
-- 3. Build this program automatically compile all ZLib.Ada95 packages under
-- GNAT Ada95 compiler.
with ZLib.Streams;
with Ada.Streams.Stream_IO;
with Ada.Numerics.Discrete_Random;
with Ada.Text_IO;
with Ada.Calendar;
procedure Test is
use Ada.Streams;
use Stream_IO;
------------------------------------
-- Test configuration parameters --
------------------------------------
File_Size : Count := 100_000;
Continuous : constant Boolean := False;
Header : constant ZLib.Header_Type := ZLib.Default;
-- ZLib.None;
-- ZLib.Auto;
-- ZLib.GZip;
-- Do not use Header other then Default in ZLib versions 1.1.4
-- and older.
Strategy : constant ZLib.Strategy_Type := ZLib.Default_Strategy;
Init_Random : constant := 10;
-- End --
In_File_Name : constant String := "testzlib.in";
-- Name of the input file
Z_File_Name : constant String := "testzlib.zlb";
-- Name of the compressed file.
Out_File_Name : constant String := "testzlib.out";
-- Name of the decompressed file.
File_In : File_Type;
File_Out : File_Type;
File_Back : File_Type;
File_Z : ZLib.Streams.Stream_Type;
Filter : ZLib.Filter_Type;
Time_Stamp : Ada.Calendar.Time;
procedure Generate_File;
-- Generate file of spetsified size with some random data.
-- The random data is repeatable, for the good compression.
procedure Compare_Streams
(Left, Right : in out Root_Stream_Type'Class);
-- The procedure compearing data in 2 streams.
-- It is for compare data before and after compression/decompression.
procedure Compare_Files (Left, Right : String);
-- Compare files. Based on the Compare_Streams.
procedure Copy_Streams
(Source, Target : in out Root_Stream_Type'Class;
Buffer_Size : in Stream_Element_Offset := 1024);
-- Copying data from one stream to another. It is for test stream
-- interface of the library.
procedure Data_In
(Item : out Stream_Element_Array;
Last : out Stream_Element_Offset);
-- this procedure is for generic instantiation of
-- ZLib.Generic_Translate.
-- reading data from the File_In.
procedure Data_Out (Item : in Stream_Element_Array);
-- this procedure is for generic instantiation of
-- ZLib.Generic_Translate.
-- writing data to the File_Out.
procedure Stamp;
-- Store the timestamp to the local variable.
procedure Print_Statistic (Msg : String; Data_Size : ZLib.Count);
-- Print the time statistic with the message.
procedure Translate is new ZLib.Generic_Translate
(Data_In => Data_In,
Data_Out => Data_Out);
-- This procedure is moving data from File_In to File_Out
-- with compression or decompression, depend on initialization of
-- Filter parameter.
-------------------
-- Compare_Files --
-------------------
procedure Compare_Files (Left, Right : String) is
Left_File, Right_File : File_Type;
begin
Open (Left_File, In_File, Left);
Open (Right_File, In_File, Right);
Compare_Streams (Stream (Left_File).all, Stream (Right_File).all);
Close (Left_File);
Close (Right_File);
end Compare_Files;
---------------------
-- Compare_Streams --
---------------------
procedure Compare_Streams
(Left, Right : in out Ada.Streams.Root_Stream_Type'Class)
is
Left_Buffer, Right_Buffer : Stream_Element_Array (0 .. 16#FFF#);
Left_Last, Right_Last : Stream_Element_Offset;
begin
loop
Read (Left, Left_Buffer, Left_Last);
Read (Right, Right_Buffer, Right_Last);
if Left_Last /= Right_Last then
Ada.Text_IO.Put_Line ("Compare error :"
& Stream_Element_Offset'Image (Left_Last)
& " /= "
& Stream_Element_Offset'Image (Right_Last));
raise Constraint_Error;
elsif Left_Buffer (0 .. Left_Last)
/= Right_Buffer (0 .. Right_Last)
then
Ada.Text_IO.Put_Line ("ERROR: IN and OUT files is not equal.");
raise Constraint_Error;
end if;
exit when Left_Last < Left_Buffer'Last;
end loop;
end Compare_Streams;
------------------
-- Copy_Streams --
------------------
procedure Copy_Streams
(Source, Target : in out Ada.Streams.Root_Stream_Type'Class;
Buffer_Size : in Stream_Element_Offset := 1024)
is
Buffer : Stream_Element_Array (1 .. Buffer_Size);
Last : Stream_Element_Offset;
begin
loop
Read (Source, Buffer, Last);
Write (Target, Buffer (1 .. Last));
exit when Last < Buffer'Last;
end loop;
end Copy_Streams;
-------------
-- Data_In --
-------------
procedure Data_In
(Item : out Stream_Element_Array;
Last : out Stream_Element_Offset) is
begin
Read (File_In, Item, Last);
end Data_In;
--------------
-- Data_Out --
--------------
procedure Data_Out (Item : in Stream_Element_Array) is
begin
Write (File_Out, Item);
end Data_Out;
-------------------
-- Generate_File --
-------------------
procedure Generate_File is
subtype Visible_Symbols is Stream_Element range 16#20# .. 16#7E#;
package Random_Elements is
new Ada.Numerics.Discrete_Random (Visible_Symbols);
Gen : Random_Elements.Generator;
Buffer : Stream_Element_Array := (1 .. 77 => 16#20#) & 10;
Buffer_Count : constant Count := File_Size / Buffer'Length;
-- Number of same buffers in the packet.
Density : constant Count := 30; -- from 0 to Buffer'Length - 2;
procedure Fill_Buffer (J, D : in Count);
-- Change the part of the buffer.
-----------------
-- Fill_Buffer --
-----------------
procedure Fill_Buffer (J, D : in Count) is
begin
for K in 0 .. D loop
Buffer
(Stream_Element_Offset ((J + K) mod (Buffer'Length - 1) + 1))
:= Random_Elements.Random (Gen);
end loop;
end Fill_Buffer;
begin
Random_Elements.Reset (Gen, Init_Random);
Create (File_In, Out_File, In_File_Name);
Fill_Buffer (1, Buffer'Length - 2);
for J in 1 .. Buffer_Count loop
Write (File_In, Buffer);
Fill_Buffer (J, Density);
end loop;
-- fill remain size.
Write
(File_In,
Buffer
(1 .. Stream_Element_Offset
(File_Size - Buffer'Length * Buffer_Count)));
Flush (File_In);
Close (File_In);
end Generate_File;
---------------------
-- Print_Statistic --
---------------------
procedure Print_Statistic (Msg : String; Data_Size : ZLib.Count) is
use Ada.Calendar;
use Ada.Text_IO;
package Count_IO is new Integer_IO (ZLib.Count);
Curr_Dur : Duration := Clock - Time_Stamp;
begin
Put (Msg);
Set_Col (20);
Ada.Text_IO.Put ("size =");
Count_IO.Put
(Data_Size,
Width => Stream_IO.Count'Image (File_Size)'Length);
Put_Line (" duration =" & Duration'Image (Curr_Dur));
end Print_Statistic;
-----------
-- Stamp --
-----------
procedure Stamp is
begin
Time_Stamp := Ada.Calendar.Clock;
end Stamp;
begin
Ada.Text_IO.Put_Line ("ZLib " & ZLib.Version);
loop
Generate_File;
for Level in ZLib.Compression_Level'Range loop
Ada.Text_IO.Put_Line ("Level ="
& ZLib.Compression_Level'Image (Level));
-- Test generic interface.
Open (File_In, In_File, In_File_Name);
Create (File_Out, Out_File, Z_File_Name);
Stamp;
-- Deflate using generic instantiation.
ZLib.Deflate_Init
(Filter => Filter,
Level => Level,
Strategy => Strategy,
Header => Header);
Translate (Filter);
Print_Statistic ("Generic compress", ZLib.Total_Out (Filter));
ZLib.Close (Filter);
Close (File_In);
Close (File_Out);
Open (File_In, In_File, Z_File_Name);
Create (File_Out, Out_File, Out_File_Name);
Stamp;
-- Inflate using generic instantiation.
ZLib.Inflate_Init (Filter, Header => Header);
Translate (Filter);
Print_Statistic ("Generic decompress", ZLib.Total_Out (Filter));
ZLib.Close (Filter);
Close (File_In);
Close (File_Out);
Compare_Files (In_File_Name, Out_File_Name);
-- Test stream interface.
-- Compress to the back stream.
Open (File_In, In_File, In_File_Name);
Create (File_Back, Out_File, Z_File_Name);
Stamp;
ZLib.Streams.Create
(Stream => File_Z,
Mode => ZLib.Streams.Out_Stream,
Back => ZLib.Streams.Stream_Access
(Stream (File_Back)),
Back_Compressed => True,
Level => Level,
Strategy => Strategy,
Header => Header);
Copy_Streams
(Source => Stream (File_In).all,
Target => File_Z);
-- Flushing internal buffers to the back stream.
ZLib.Streams.Flush (File_Z, ZLib.Finish);
Print_Statistic ("Write compress",
ZLib.Streams.Write_Total_Out (File_Z));
ZLib.Streams.Close (File_Z);
Close (File_In);
Close (File_Back);
-- Compare reading from original file and from
-- decompression stream.
Open (File_In, In_File, In_File_Name);
Open (File_Back, In_File, Z_File_Name);
ZLib.Streams.Create
(Stream => File_Z,
Mode => ZLib.Streams.In_Stream,
Back => ZLib.Streams.Stream_Access
(Stream (File_Back)),
Back_Compressed => True,
Header => Header);
Stamp;
Compare_Streams (Stream (File_In).all, File_Z);
Print_Statistic ("Read decompress",
ZLib.Streams.Read_Total_Out (File_Z));
ZLib.Streams.Close (File_Z);
Close (File_In);
Close (File_Back);
-- Compress by reading from compression stream.
Open (File_Back, In_File, In_File_Name);
Create (File_Out, Out_File, Z_File_Name);
ZLib.Streams.Create
(Stream => File_Z,
Mode => ZLib.Streams.In_Stream,
Back => ZLib.Streams.Stream_Access
(Stream (File_Back)),
Back_Compressed => False,
Level => Level,
Strategy => Strategy,
Header => Header);
Stamp;
Copy_Streams
(Source => File_Z,
Target => Stream (File_Out).all);
Print_Statistic ("Read compress",
ZLib.Streams.Read_Total_Out (File_Z));
ZLib.Streams.Close (File_Z);
Close (File_Out);
Close (File_Back);
-- Decompress to decompression stream.
Open (File_In, In_File, Z_File_Name);
Create (File_Back, Out_File, Out_File_Name);
ZLib.Streams.Create
(Stream => File_Z,
Mode => ZLib.Streams.Out_Stream,
Back => ZLib.Streams.Stream_Access
(Stream (File_Back)),
Back_Compressed => False,
Header => Header);
Stamp;
Copy_Streams
(Source => Stream (File_In).all,
Target => File_Z);
Print_Statistic ("Write decompress",
ZLib.Streams.Write_Total_Out (File_Z));
ZLib.Streams.Close (File_Z);
Close (File_In);
Close (File_Back);
Compare_Files (In_File_Name, Out_File_Name);
end loop;
Ada.Text_IO.Put_Line (Count'Image (File_Size) & " Ok.");
exit when not Continuous;
File_Size := File_Size + 1;
end loop;
end Test;
|
reznikmm/slimp | Ada | 1,232 | adb | -- Copyright (c) 2019 Maxim Reznik <[email protected]>
--
-- SPDX-License-Identifier: MIT
-- License-Filename: LICENSE
-------------------------------------------------------------
with Slim.Message_Visiters;
package body Slim.Messages.DSCO is
List : constant Field_Description_Array :=
(1 => (Uint_8_Field, 1)); -- Disconnection reasons
----------
-- Read --
----------
overriding function Read
(Data : not null access
League.Stream_Element_Vectors.Stream_Element_Vector)
return DSCO_Message is
begin
return Result : DSCO_Message do
Read_Fields (Result, List, Data.all);
end return;
end Read;
-----------
-- Visit --
-----------
overriding procedure Visit
(Self : not null access DSCO_Message;
Visiter : in out Slim.Message_Visiters.Visiter'Class)
is
begin
Visiter.DSCO (Self);
end Visit;
-----------
-- Write --
-----------
overriding procedure Write
(Self : DSCO_Message;
Tag : out Message_Tag;
Data : out League.Stream_Element_Vectors.Stream_Element_Vector)
is
begin
Tag := "DSCO";
Write_Fields (Self, List, Data);
end Write;
end Slim.Messages.DSCO;
|
1Crazymoney/LearnAda | Ada | 222 | adb | with Ada.Integer_Text_IO;
procedure Sum is
N : Integer;
Sum : Integer := 1;
begin
Ada.Integer_Text_IO.Get( N );
for I in 1..N loop
Sum := Sum + I;
end loop;
Ada.Integer_Text_IO.Put( Sum );
end Sum;
|
AdaCore/libadalang | Ada | 554 | adb | procedure Test is
generic
type A is private;
package Pkg_A_G is
generic
type B;
procedure Foo (X : A);
end Pkg_A_G;
package body Pkg_A_G is
procedure Foo (X : A) is
begin
null;
end Foo;
end Pkg_A_G;
generic
type B is private;
package Pkg_B_G is
package Pkg_A_I is new Pkg_A_G (A => B);
procedure Foo is new Pkg_A_I.Foo (B => B);
end Pkg_B_G;
package Pkg_B_I is new Pkg_B_G (B => Integer);
begin
Pkg_B_I.Foo (42);
pragma Test_Statement;
end Test;
|
rguilloteau/pok | Ada | 614 | adb | -- POK header
--
-- The following file is a part of the POK project. Any modification should
-- be made according to the POK licence. You CANNOT use this file or a part
-- of a file for your own project.
--
-- For more information on the POK licence, please see our LICENCE FILE
--
-- Please follow the coding guidelines described in doc/CODING_GUIDELINES
--
-- Copyright (c) 2007-2020 POK team
with User;
use User;
package body Subprograms is
procedure Hello_Part1 is
begin
User.Hello_Part1 ();
end Hello_Part1;
end Subprograms;
|
SayCV/rtems-addon-packages | Ada | 8,897 | adb | ------------------------------------------------------------------------------
-- --
-- GNAT ncurses Binding Samples --
-- --
-- Sample.Menu_Demo.Aux --
-- --
-- B O D Y --
-- --
------------------------------------------------------------------------------
-- Copyright (c) 1998-2006,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$
-- $Date$
-- Binding Version 01.00
------------------------------------------------------------------------------
with Ada.Characters.Latin_1; use Ada.Characters.Latin_1;
with Sample.Manifest; use Sample.Manifest;
with Sample.Helpers; use Sample.Helpers;
with Sample.Keyboard_Handler; use Sample.Keyboard_Handler;
with Sample.Explanation; use Sample.Explanation;
package body Sample.Menu_Demo.Aux is
procedure Geometry (M : Menu;
L : out Line_Count;
C : out Column_Count;
Y : out Line_Position;
X : out Column_Position;
Fy : out Line_Position;
Fx : out Column_Position);
procedure Geometry (M : Menu;
L : out Line_Count; -- Lines used for menu
C : out Column_Count; -- Columns used for menu
Y : out Line_Position; -- Proposed Line for menu
X : out Column_Position; -- Proposed Column for menu
Fy : out Line_Position; -- Vertical inner frame
Fx : out Column_Position) -- Horiz. inner frame
is
Spc_Desc : Column_Position; -- spaces between description and item
begin
Set_Mark (M, Menu_Marker);
Spacing (M, Spc_Desc, Fy, Fx);
Scale (M, L, C);
Fx := Fx + Column_Position (Fy - 1); -- looks a bit nicer
L := L + 2 * Fy; -- count for frame at top and bottom
C := C + 2 * Fx; -- "
-- Calculate horizontal coordinate at the screen center
X := (Columns - C) / 2;
Y := 1; -- always startin line 1
end Geometry;
procedure Geometry (M : Menu;
L : out Line_Count; -- Lines used for menu
C : out Column_Count; -- Columns used for menu
Y : out Line_Position; -- Proposed Line for menu
X : out Column_Position) -- Proposed Column for menu
is
Fy : Line_Position;
Fx : Column_Position;
begin
Geometry (M, L, C, Y, X, Fy, Fx);
end Geometry;
function Create (M : Menu;
Title : String;
Lin : Line_Position;
Col : Column_Position) return Panel
is
W, S : Window;
L : Line_Count;
C : Column_Count;
Y, Fy : Line_Position;
X, Fx : Column_Position;
Pan : Panel;
begin
Geometry (M, L, C, Y, X, Fy, Fx);
W := New_Window (L, C, Lin, Col);
Set_Meta_Mode (W);
Set_KeyPad_Mode (W);
if Has_Colors then
Set_Background (Win => W,
Ch => (Ch => ' ',
Color => Menu_Back_Color,
Attr => Normal_Video));
Set_Foreground (Men => M, Color => Menu_Fore_Color);
Set_Background (Men => M, Color => Menu_Back_Color);
Set_Grey (Men => M, Color => Menu_Grey_Color);
Erase (W);
end if;
S := Derived_Window (W, L - Fy, C - Fx, Fy, Fx);
Set_Meta_Mode (S);
Set_KeyPad_Mode (S);
Box (W);
Set_Window (M, W);
Set_Sub_Window (M, S);
if Title'Length > 0 then
Window_Title (W, Title);
end if;
Pan := New_Panel (W);
Post (M);
return Pan;
end Create;
procedure Destroy (M : Menu;
P : in out Panel)
is
W, S : Window;
begin
W := Get_Window (M);
S := Get_Sub_Window (M);
Post (M, False);
Erase (W);
Delete (P);
Set_Window (M, Null_Window);
Set_Sub_Window (M, Null_Window);
Delete (S);
Delete (W);
Update_Panels;
end Destroy;
function Get_Request (M : Menu; P : Panel) return Key_Code
is
W : constant Window := Get_Window (M);
K : Real_Key_Code;
Ch : Character;
begin
Top (P);
loop
K := Get_Key (W);
if K in Special_Key_Code'Range then
case K is
when HELP_CODE => Explain_Context;
when EXPLAIN_CODE => Explain ("MENUKEYS");
when Key_Home => return REQ_FIRST_ITEM;
when QUIT_CODE => return QUIT;
when Key_Cursor_Down => return REQ_DOWN_ITEM;
when Key_Cursor_Up => return REQ_UP_ITEM;
when Key_Cursor_Left => return REQ_LEFT_ITEM;
when Key_Cursor_Right => return REQ_RIGHT_ITEM;
when Key_End => return REQ_LAST_ITEM;
when Key_Backspace => return REQ_BACK_PATTERN;
when Key_Next_Page => return REQ_SCR_DPAGE;
when Key_Previous_Page => return REQ_SCR_UPAGE;
when others => return K;
end case;
elsif K in Normal_Key_Code'Range then
Ch := Character'Val (K);
case Ch is
when CAN => return QUIT; -- CTRL-X
when SO => return REQ_NEXT_ITEM; -- CTRL-N
when DLE => return REQ_PREV_ITEM; -- CTRL-P
when NAK => return REQ_SCR_ULINE; -- CTRL-U
when EOT => return REQ_SCR_DLINE; -- CTRL-D
when ACK => return REQ_SCR_DPAGE; -- CTRL-F
when STX => return REQ_SCR_UPAGE; -- CTRL-B
when EM => return REQ_CLEAR_PATTERN; -- CTRL-Y
when BS => return REQ_BACK_PATTERN; -- CTRL-H
when SOH => return REQ_NEXT_MATCH; -- CTRL-A
when ENQ => return REQ_PREV_MATCH; -- CTRL-E
when DC4 => return REQ_TOGGLE_ITEM; -- CTRL-T
when CR | LF => return SELECT_ITEM;
when others => return K;
end case;
else
return K;
end if;
end loop;
end Get_Request;
end Sample.Menu_Demo.Aux;
|
reznikmm/matreshka | Ada | 4,655 | adb | ------------------------------------------------------------------------------
-- --
-- Matreshka Project --
-- --
-- Open Document Toolkit --
-- --
-- Runtime Library Component --
-- --
------------------------------------------------------------------------------
-- --
-- Copyright © 2014, Vadim Godunko <[email protected]> --
-- All rights reserved. --
-- --
-- Redistribution and use in source and binary forms, with or without --
-- modification, are permitted provided that the following conditions --
-- are met: --
-- --
-- * Redistributions of source code must retain the above copyright --
-- notice, this list of conditions and the following disclaimer. --
-- --
-- * Redistributions in binary form must reproduce the above copyright --
-- notice, this list of conditions and the following disclaimer in the --
-- documentation and/or other materials provided with the distribution. --
-- --
-- * Neither the name of the Vadim Godunko, IE nor the names of its --
-- contributors may be used to endorse or promote products derived from --
-- this software without specific prior written permission. --
-- --
-- THIS SOFTWARE IS PROVIDED BY THE COPYRIGHT HOLDERS AND CONTRIBUTORS --
-- "AS IS" AND ANY EXPRESS OR IMPLIED WARRANTIES, INCLUDING, BUT NOT --
-- LIMITED TO, THE IMPLIED WARRANTIES OF MERCHANTABILITY AND FITNESS FOR --
-- A PARTICULAR PURPOSE ARE DISCLAIMED. IN NO EVENT SHALL THE COPYRIGHT --
-- HOLDER OR CONTRIBUTORS BE LIABLE FOR ANY DIRECT, INDIRECT, INCIDENTAL, --
-- SPECIAL, EXEMPLARY, OR CONSEQUENTIAL DAMAGES (INCLUDING, BUT NOT LIMITED --
-- TO, PROCUREMENT OF SUBSTITUTE GOODS OR SERVICES; LOSS OF USE, DATA, OR --
-- PROFITS; OR BUSINESS INTERRUPTION) HOWEVER CAUSED AND ON ANY THEORY OF --
-- LIABILITY, WHETHER IN CONTRACT, STRICT LIABILITY, OR TORT (INCLUDING --
-- NEGLIGENCE OR OTHERWISE) ARISING IN ANY WAY OUT OF THE USE OF THIS --
-- SOFTWARE, EVEN IF ADVISED OF THE POSSIBILITY OF SUCH DAMAGE. --
-- --
------------------------------------------------------------------------------
-- $Revision$ $Date$
------------------------------------------------------------------------------
with Matreshka.DOM_Documents;
with Matreshka.ODF_String_Constants;
with ODF.DOM.Iterators;
with ODF.DOM.Visitors;
package body Matreshka.ODF_Draw.Extrusion_Origin_Attributes is
------------
-- Create --
------------
overriding function Create
(Parameters : not null access Matreshka.DOM_Attributes.Attribute_L2_Parameters)
return Draw_Extrusion_Origin_Attribute_Node is
begin
return Self : Draw_Extrusion_Origin_Attribute_Node do
Matreshka.ODF_Draw.Constructors.Initialize
(Self'Unchecked_Access,
Parameters.Document,
Matreshka.ODF_String_Constants.Draw_Prefix);
end return;
end Create;
--------------------
-- Get_Local_Name --
--------------------
overriding function Get_Local_Name
(Self : not null access constant Draw_Extrusion_Origin_Attribute_Node)
return League.Strings.Universal_String
is
pragma Unreferenced (Self);
begin
return Matreshka.ODF_String_Constants.Extrusion_Origin_Attribute;
end Get_Local_Name;
begin
Matreshka.DOM_Documents.Register_Attribute
(Matreshka.ODF_String_Constants.Draw_URI,
Matreshka.ODF_String_Constants.Extrusion_Origin_Attribute,
Draw_Extrusion_Origin_Attribute_Node'Tag);
end Matreshka.ODF_Draw.Extrusion_Origin_Attributes;
|
stcarrez/hyperion | Ada | 910 | ads | -----------------------------------------------------------------------
-- hyperion-monitoring -- Module monitoring
-- Copyright (C) 2018 Stephane Carrez
-- Written by Stephane Carrez ([email protected])
--
-- Licensed under the Apache License, Version 2.0 (the "License");
-- you may not use this file except in compliance with the License.
-- You may obtain a copy of the License at
--
-- http://www.apache.org/licenses/LICENSE-2.0
--
-- Unless required by applicable law or agreed to in writing, software
-- distributed under the License is distributed on an "AS IS" BASIS,
-- WITHOUT WARRANTIES OR CONDITIONS OF ANY KIND, either express or implied.
-- See the License for the specific language governing permissions and
-- limitations under the License.
-----------------------------------------------------------------------
package Hyperion.Monitoring is
end Hyperion.Monitoring;
|
dan76/Amass | Ada | 3,084 | ads | -- Copyright © by Jeff Foley 2017-2023. All rights reserved.
-- Use of this source code is governed by Apache 2 LICENSE that can be found in the LICENSE file.
-- SPDX-License-Identifier: Apache-2.0
local json = require("json")
name = "GitHub"
type = "api"
local rate_error_url = "https://docs.github.com/rest/overview/resources-in-the-rest-api#rate-limiting"
function start()
set_rate_limit(7)
end
function check()
local c
local cfg = datasrc_config()
if (cfg ~= nil) then
c = cfg.credentials
end
if (c ~= nil and c.key ~= nil and c.key ~= "") then
return true
end
return false
end
function vertical(ctx, domain)
local c
local cfg = datasrc_config()
if (cfg ~= nil) then
c = cfg.credentials
end
if (c == nil or c.key == nil or c.key == "") then
return
end
for i=1,100 do
local resp, err = request(ctx, {
['url']=build_url(domain, i),
['header']={['Authorization']="token " .. c.key},
})
if (err ~= nil and err ~= "") then
log(ctx, "vertical request to service failed: " .. err)
return
elseif (resp.status_code < 200 or resp.status_code >= 400) then
log(ctx, "vertical request to service returned with status: " .. resp.status)
return
end
local d = json.decode(resp.body)
if (d == nil) then
log(ctx, "failed to decode the JSON response")
return
elseif (d.total_count == nil or d.total_count == 0 or #(d.items) == 0) then
return
end
for _, item in pairs(d.items) do
if (item ~= nil and item.url ~= nil and
item.url ~= "" and search_item(ctx, item.url)) then
return
end
end
end
end
function search_item(ctx, url)
local resp, err = request(ctx, {['url']=url})
if (err ~= nil and err ~= "") then
log(ctx, "first search_item request to service failed: " .. err)
return true
elseif (resp.status_code < 200 or resp.status_code >= 400) then
log(ctx, "first search_item request to service returned with status: " .. resp.status)
return true
end
local d = json.decode(resp.body)
if (d == nil) then
log(ctx, "failed to decode the JSON response")
return true
elseif (d.download_url == nil or d.download_url == rate_error_url) then
log(ctx, "API rate limit exceeded")
return true
end
resp, err = request(ctx, {['url']=d.download_url})
if (err ~= nil and err ~= "") then
log(ctx, "second search_item request to service failed: " .. err)
return
elseif (resp.status_code < 200 or resp.status_code >= 400) then
log(ctx, "second search_item request to service returned with status: " .. resp.status)
return
end
send_names(ctx, resp.body)
end
function build_url(domain, pagenum)
return "https://api.github.com/search/code?q=\"" .. domain .. "\"&page=" .. pagenum .. "&per_page=100"
end
|
damaki/SPARKNaCl | Ada | 1,331 | adb | with SPARKNaCl; use SPARKNaCl;
with SPARKNaCl.Core;
with SPARKNaCl.Secretbox; use SPARKNaCl.Secretbox;
with SPARKNaCl.Stream;
with Random;
with Ada.Text_IO; use Ada.Text_IO;
with Interfaces; use Interfaces;
procedure Secretbox7
is
RK : Bytes_32;
K : Core.Salsa20_Key;
N : Stream.HSalsa20_Nonce;
S, S2 : Boolean;
begin
for MLen in N32 range 0 .. 999 loop
Random.Random_Bytes (RK);
Core.Construct (K, RK);
Random.Random_Bytes (Bytes_24 (N));
Put ("Secretbox7 - iteration" & MLen'Img);
declare
subtype Text is
Byte_Seq (0 .. Secretbox_Zero_Bytes + MLen - 1);
M, C, M2 : Text := (others => 0);
begin
Random.Random_Bytes (M (Secretbox_Zero_Bytes .. M'Last));
Create (C, S, M, N, K);
if S then
Open (M2, S2, C, N, K);
if S2 then
if not Equal (M, M2) then
Put_Line ("bad decryption");
exit;
else
Put_Line (" OK");
end if;
else
Put_Line ("ciphertext fails verification");
exit;
end if;
else
Put_Line ("bad encryption");
exit;
end if;
end;
end loop;
end Secretbox7;
|
dkm/atomic | Ada | 6,632 | ads | generic
type T is range <>;
package Atomic.Signed
with Preelaborate, Spark_Mode => On,
Abstract_State => null
is
-- Based on GCC atomic built-ins. See:
-- https://gcc.gnu.org/onlinedocs/gcc/_005f_005fatomic-Builtins.html
--
-- The specification is exactly the same for all sizes of data (8, 16, 32,
-- 64).
pragma Compile_Time_Error
(T'Object_Size not in 8 | 16 | 32 | 64,
"Atomic builtins not available for objects of this size");
type Instance is limited private;
-- This type is limited and private, it can only be manipulated using the
-- primitives below.
function Init (Val : T) return Instance
with Post => Value (Init'Result) = Val;
-- Can be used to initialize an atomic instance:
--
-- A : Atomic.Unsigned_8.Instance := Atomic.Unsigned_8.Init (0);
function Value (This : Instance) return T
with Ghost;
-- Ghost function to get the value of an instance without needing it
-- aliased. This function can be used in contracts for instance.
-- This doesn't use the atomic built-ins.
function Load (This : aliased Instance;
Order : Mem_Order := Seq_Cst)
return T
with Pre => Order in Relaxed | Consume | Acquire | Seq_Cst,
Post => Load'Result = Value (This);
procedure Store (This : aliased in out Instance;
Val : T;
Order : Mem_Order := Seq_Cst)
with Pre => Order in Relaxed | Release | Seq_Cst,
Post => Value (This) = Val;
procedure Exchange (This : aliased in out Instance;
Val : T;
Old : out T;
Order : Mem_Order := Seq_Cst)
with Pre => Order in Relaxed | Acquire | Release | Acq_Rel | Seq_Cst,
Post => Old = Value (This)'Old and then Value (This) = Val;
procedure Compare_Exchange (This : aliased in out Instance;
Expected : T;
Desired : T;
Weak : Boolean;
Success : out Boolean;
Success_Order : Mem_Order := Seq_Cst;
Failure_Order : Mem_Order := Seq_Cst)
with Pre => Failure_Order in Relaxed | Consume | Acquire | Seq_Cst
and then
not Stronger (Failure_Order, Success_Order),
Post => Success = (Value (This)'Old = Expected)
and then
(if Success then Value (This) = Desired);
procedure Add (This : aliased in out Instance;
Val : T;
Order : Mem_Order := Seq_Cst)
with Post => Value (This) = Value (This)'Old + Val;
procedure Sub (This : aliased in out Instance;
Val : T;
Order : Mem_Order := Seq_Cst)
with Post => Value (This) = Value (This)'Old - Val;
procedure Add_Fetch (This : aliased in out Instance;
Val : T;
Result : out T;
Order : Mem_Order := Seq_Cst)
with Post => Result = (Value (This)'Old + Val)
and then Value (This) = Result;
procedure Sub_Fetch (This : aliased in out Instance;
Val : T;
Result : out T;
Order : Mem_Order := Seq_Cst)
with Post => Result = (Value (This)'Old - Val)
and then Value (This) = Result;
procedure Fetch_Add (This : aliased in out Instance;
Val : T;
Result : out T;
Order : Mem_Order := Seq_Cst)
with Post => Result = Value (This)'Old
and Value (This) = (Value (This)'Old + Val);
procedure Fetch_Sub (This : aliased in out Instance;
Val : T;
Result : out T;
Order : Mem_Order := Seq_Cst)
with Post => Result = Value (This)'Old
and Value (This) = (Value (This)'Old - Val);
-- NOT SPARK compatible --
function Exchange (This : aliased in out Instance;
Val : T;
Order : Mem_Order := Seq_Cst)
return T
with SPARK_Mode => Off,
Post => Exchange'Result = Value (This)'Old
and then Value (This) = Val;
function Compare_Exchange (This : aliased in out Instance;
Expected : T;
Desired : T;
Weak : Boolean;
Success_Order : Mem_Order := Seq_Cst;
Failure_Order : Mem_Order := Seq_Cst)
return Boolean
with SPARK_Mode => Off,
Post =>
Compare_Exchange'Result = (Value (This)'Old = Expected)
and then
(if Compare_Exchange'Result then Value (This) = Desired);
function Add_Fetch (This : aliased in out Instance;
Val : T;
Order : Mem_Order := Seq_Cst)
return T
with SPARK_Mode => Off,
Post => Add_Fetch'Result = (Value (This)'Old + Val)
and then Value (This) = Add_Fetch'Result;
function Sub_Fetch (This : aliased in out Instance;
Val : T;
Order : Mem_Order := Seq_Cst)
return T
with SPARK_Mode => Off,
Post => Sub_Fetch'Result = (Value (This)'Old - Val)
and then Value (This) = Sub_Fetch'Result;
function Fetch_Add (This : aliased in out Instance;
Val : T;
Order : Mem_Order := Seq_Cst)
return T
with SPARK_Mode => Off;
function Fetch_Sub (This : aliased in out Instance;
Val : T;
Order : Mem_Order := Seq_Cst)
return T
with SPARK_Mode => Off;
private
type Instance is new T;
----------
-- Init --
----------
function Init (Val : T) return Instance
is (Instance (Val));
-----------
-- Value --
-----------
function Value (This : Instance) return T
is (T (This));
pragma Inline (Init);
pragma Inline (Load);
pragma Inline (Store);
pragma Inline (Exchange);
pragma Inline (Compare_Exchange);
pragma Inline (Add);
pragma Inline (Sub);
pragma Inline (Add_Fetch);
pragma Inline (Sub_Fetch);
pragma Inline (Fetch_Add);
pragma Inline (Fetch_Sub);
end Atomic.Signed;
|
zhmu/ananas | Ada | 3,059 | ads | ------------------------------------------------------------------------------
-- --
-- GNAT RUN-TIME COMPONENTS --
-- --
-- S Y S T E M . A S S E R T I O N S --
-- --
-- S p e c --
-- --
-- Copyright (C) 1992-2022, Free Software Foundation, Inc. --
-- --
-- GNAT is free software; you can redistribute it and/or modify it under --
-- terms of the GNU General Public License as published by the Free Soft- --
-- ware Foundation; either version 3, or (at your option) any later ver- --
-- sion. GNAT is distributed in the hope that it will be useful, but WITH- --
-- OUT ANY WARRANTY; without even the implied warranty of MERCHANTABILITY --
-- or FITNESS FOR A PARTICULAR PURPOSE. --
-- --
-- As a special exception under Section 7 of GPL version 3, you are granted --
-- additional permissions described in the GCC Runtime Library Exception, --
-- version 3.1, as published by the Free Software Foundation. --
-- --
-- You should have received a copy of the GNU General Public License and --
-- a copy of the GCC Runtime Library Exception along with this program; --
-- see the files COPYING3 and COPYING.RUNTIME respectively. If not, see --
-- <http://www.gnu.org/licenses/>. --
-- --
-- GNAT was originally developed by the GNAT team at New York University. --
-- Extensive contributions were provided by Ada Core Technologies Inc. --
-- --
------------------------------------------------------------------------------
-- This package provides support for assertions (including pragma Assert,
-- pragma Debug, and Precondition/Postcondition/Predicate/Invariant aspects
-- and their corresponding pragmas).
-- This unit may be used directly from an application program by providing
-- an appropriate WITH, and the interface can be expected to remain stable.
with Ada.Assertions;
package System.Assertions is
Assert_Failure : exception renames Ada.Assertions.Assertion_Error;
-- Exception raised when assertion fails
procedure Raise_Assert_Failure (Msg : String);
pragma No_Return (Raise_Assert_Failure);
-- Called to raise Assert_Failure with given message
end System.Assertions;
|
charlie5/lace | Ada | 1,658 | ads | with
lace.Any;
private
with
lace.make_Subject,
lace.make_Observer,
ada.Strings.unbounded;
package chat.Client.local
--
-- Provides a local client.
-- Names must be unique.
--
is
type Item is limited new lace.Any.limited_item
and chat.Client .item with private;
type View is access all Item'Class;
-- Forge
--
function to_Client (Name : in String) return Item;
-- Attributes
--
overriding
function Name (Self : in Item) return String;
overriding
function as_Observer (Self : access Item) return lace.Observer.view;
overriding
function as_Subject (Self : access Item) return lace.Subject.view;
-- Operations
--
procedure start (Self : in out chat.Client.local.item);
overriding
procedure register_Client (Self : in out Item; other_Client : in Client.view);
overriding
procedure deregister_Client (Self : in out Item; other_Client_as_Observer : in lace.Observer.view;
other_Client_Name : in String);
overriding
procedure Registrar_has_shutdown (Self : in out Item);
private
package Observer is new lace.make_Observer (lace.Any.limited_item);
package Subject is new lace.make_Subject (Observer .item);
use ada.Strings.unbounded;
type Item is limited new Subject .item
and chat.Client.item with
record
Name : unbounded_String;
Registrar_has_shutdown : Boolean := False;
Registrar_is_dead : Boolean := False;
end record;
end chat.Client.local;
|
reznikmm/matreshka | Ada | 3,929 | ads | ------------------------------------------------------------------------------
-- --
-- Matreshka Project --
-- --
-- Open Document Toolkit --
-- --
-- Runtime Library Component --
-- --
------------------------------------------------------------------------------
-- --
-- Copyright © 2014, Vadim Godunko <[email protected]> --
-- All rights reserved. --
-- --
-- Redistribution and use in source and binary forms, with or without --
-- modification, are permitted provided that the following conditions --
-- are met: --
-- --
-- * Redistributions of source code must retain the above copyright --
-- notice, this list of conditions and the following disclaimer. --
-- --
-- * Redistributions in binary form must reproduce the above copyright --
-- notice, this list of conditions and the following disclaimer in the --
-- documentation and/or other materials provided with the distribution. --
-- --
-- * Neither the name of the Vadim Godunko, IE nor the names of its --
-- contributors may be used to endorse or promote products derived from --
-- this software without specific prior written permission. --
-- --
-- THIS SOFTWARE IS PROVIDED BY THE COPYRIGHT HOLDERS AND CONTRIBUTORS --
-- "AS IS" AND ANY EXPRESS OR IMPLIED WARRANTIES, INCLUDING, BUT NOT --
-- LIMITED TO, THE IMPLIED WARRANTIES OF MERCHANTABILITY AND FITNESS FOR --
-- A PARTICULAR PURPOSE ARE DISCLAIMED. IN NO EVENT SHALL THE COPYRIGHT --
-- HOLDER OR CONTRIBUTORS BE LIABLE FOR ANY DIRECT, INDIRECT, INCIDENTAL, --
-- SPECIAL, EXEMPLARY, OR CONSEQUENTIAL DAMAGES (INCLUDING, BUT NOT LIMITED --
-- TO, PROCUREMENT OF SUBSTITUTE GOODS OR SERVICES; LOSS OF USE, DATA, OR --
-- PROFITS; OR BUSINESS INTERRUPTION) HOWEVER CAUSED AND ON ANY THEORY OF --
-- LIABILITY, WHETHER IN CONTRACT, STRICT LIABILITY, OR TORT (INCLUDING --
-- NEGLIGENCE OR OTHERWISE) ARISING IN ANY WAY OUT OF THE USE OF THIS --
-- SOFTWARE, EVEN IF ADVISED OF THE POSSIBILITY OF SUCH DAMAGE. --
-- --
------------------------------------------------------------------------------
-- $Revision$ $Date$
------------------------------------------------------------------------------
with ODF.DOM.Text_C_Attributes;
package Matreshka.ODF_Text.C_Attributes is
type Text_C_Attribute_Node is
new Matreshka.ODF_Text.Abstract_Text_Attribute_Node
and ODF.DOM.Text_C_Attributes.ODF_Text_C_Attribute
with null record;
overriding function Create
(Parameters : not null access Matreshka.DOM_Attributes.Attribute_L2_Parameters)
return Text_C_Attribute_Node;
overriding function Get_Local_Name
(Self : not null access constant Text_C_Attribute_Node)
return League.Strings.Universal_String;
end Matreshka.ODF_Text.C_Attributes;
|
sebsgit/textproc | Ada | 1,756 | ads | with cl_objects; use cl_objects;
with opencl;
with System;
package PixelArray.Gpu is
pragma Elaborate_Body;
pragma Assertion_Policy (Pre => Check,
Post => Check,
Type_Invariant => Check);
type GpuImage is tagged limited private;
type GpuImage_Access is access all GpuImage;
function Get_Width(img: in GpuImage) return Natural;
function Get_Height(img: in GpuImage) return Natural;
function Get_Address(img: in out GpuImage) return System.Address;
function Create(ctx: in out Context'Class; flags: opencl.Mem_Flags; width, height: in Positive; status: out opencl.Status) return GpuImage;
function Upload(ctx: in out Context'Class; flags: opencl.Mem_Flags; image: in ImagePlane; status: out opencl.Status) return GpuImage;
function Download(queue: in out Command_Queue'Class; source: in out GpuImage; target: in out ImagePlane; status: out opencl.Status) return Event
with Pre => source.Get_Width = target.width and source.Get_Height = target.height;
function Download(queue: in out Command_Queue'Class; source: in out GpuImage; target: in out ImagePlane; event_to_wait: in opencl.Events; status: out opencl.Status) return Event
with Pre => source.Get_Width = target.width and source.Get_Height = target.height;
procedure Set_Size(source: in out GpuImage; context: in out cl_objects.Context'Class; width, height: in Positive);
function Upload_Image(source: in out GpuImage; ctx: in out Context'Class; queue: in out Command_Queue; image: in ImagePlane) return opencl.Status;
private
type GpuImage is tagged limited record
data: cl_objects.Buffer;
width, height: Natural;
max_size: Natural;
end record;
end PixelArray.Gpu;
|
reznikmm/matreshka | Ada | 3,760 | adb | ------------------------------------------------------------------------------
-- --
-- Matreshka Project --
-- --
-- Open Document Toolkit --
-- --
-- Runtime Library Component --
-- --
------------------------------------------------------------------------------
-- --
-- Copyright © 2013, Vadim Godunko <[email protected]> --
-- All rights reserved. --
-- --
-- Redistribution and use in source and binary forms, with or without --
-- modification, are permitted provided that the following conditions --
-- are met: --
-- --
-- * Redistributions of source code must retain the above copyright --
-- notice, this list of conditions and the following disclaimer. --
-- --
-- * Redistributions in binary form must reproduce the above copyright --
-- notice, this list of conditions and the following disclaimer in the --
-- documentation and/or other materials provided with the distribution. --
-- --
-- * Neither the name of the Vadim Godunko, IE nor the names of its --
-- contributors may be used to endorse or promote products derived from --
-- this software without specific prior written permission. --
-- --
-- THIS SOFTWARE IS PROVIDED BY THE COPYRIGHT HOLDERS AND CONTRIBUTORS --
-- "AS IS" AND ANY EXPRESS OR IMPLIED WARRANTIES, INCLUDING, BUT NOT --
-- LIMITED TO, THE IMPLIED WARRANTIES OF MERCHANTABILITY AND FITNESS FOR --
-- A PARTICULAR PURPOSE ARE DISCLAIMED. IN NO EVENT SHALL THE COPYRIGHT --
-- HOLDER OR CONTRIBUTORS BE LIABLE FOR ANY DIRECT, INDIRECT, INCIDENTAL, --
-- SPECIAL, EXEMPLARY, OR CONSEQUENTIAL DAMAGES (INCLUDING, BUT NOT LIMITED --
-- TO, PROCUREMENT OF SUBSTITUTE GOODS OR SERVICES; LOSS OF USE, DATA, OR --
-- PROFITS; OR BUSINESS INTERRUPTION) HOWEVER CAUSED AND ON ANY THEORY OF --
-- LIABILITY, WHETHER IN CONTRACT, STRICT LIABILITY, OR TORT (INCLUDING --
-- NEGLIGENCE OR OTHERWISE) ARISING IN ANY WAY OUT OF THE USE OF THIS --
-- SOFTWARE, EVEN IF ADVISED OF THE POSSIBILITY OF SUCH DAMAGE. --
-- --
------------------------------------------------------------------------------
-- $Revision$ $Date$
------------------------------------------------------------------------------
with ODF.Constants;
package body Matreshka.ODF_Attributes.FO.Wrap_Option is
--------------------
-- Get_Local_Name --
--------------------
overriding function Get_Local_Name
(Self : not null access constant FO_Wrap_Option_Node)
return League.Strings.Universal_String is
begin
return ODF.Constants.Wrap_Option_Name;
end Get_Local_Name;
end Matreshka.ODF_Attributes.FO.Wrap_Option;
|
tum-ei-rcs/StratoX | Ada | 9,017 | ads | -- This spec has been automatically generated from STM32F40x.svd
pragma Restrictions (No_Elaboration_Code);
pragma Ada_2012;
with HAL;
with System;
package STM32_SVD.SYSCFG is
pragma Preelaborate;
---------------
-- Registers --
---------------
--------------------
-- MEMRM_Register --
--------------------
subtype MEMRM_MEM_MODE_Field is HAL.UInt2;
-- memory remap register
type MEMRM_Register is record
-- MEM_MODE
MEM_MODE : MEMRM_MEM_MODE_Field := 16#0#;
-- unspecified
Reserved_2_31 : HAL.UInt30 := 16#0#;
end record
with Volatile_Full_Access, Size => 32,
Bit_Order => System.Low_Order_First;
for MEMRM_Register use record
MEM_MODE at 0 range 0 .. 1;
Reserved_2_31 at 0 range 2 .. 31;
end record;
------------------
-- PMC_Register --
------------------
-- peripheral mode configuration register
type PMC_Register is record
-- unspecified
Reserved_0_22 : HAL.UInt23 := 16#0#;
-- Ethernet PHY interface selection
MII_RMII_SEL : Boolean := False;
-- unspecified
Reserved_24_31 : HAL.Byte := 16#0#;
end record
with Volatile_Full_Access, Size => 32,
Bit_Order => System.Low_Order_First;
for PMC_Register use record
Reserved_0_22 at 0 range 0 .. 22;
MII_RMII_SEL at 0 range 23 .. 23;
Reserved_24_31 at 0 range 24 .. 31;
end record;
----------------------
-- EXTICR1_Register --
----------------------
------------------
-- EXTICR1.EXTI --
------------------
-- EXTICR1_EXTI array element
subtype EXTICR1_EXTI_Element is HAL.UInt4;
-- EXTICR1_EXTI array
type EXTICR1_EXTI_Field_Array is array (0 .. 3) of EXTICR1_EXTI_Element
with Component_Size => 4, Size => 16;
-- Type definition for EXTICR1_EXTI
type EXTICR1_EXTI_Field
(As_Array : Boolean := False)
is record
case As_Array is
when False =>
-- EXTI as a value
Val : HAL.Short;
when True =>
-- EXTI as an array
Arr : EXTICR1_EXTI_Field_Array;
end case;
end record
with Unchecked_Union, Size => 16;
for EXTICR1_EXTI_Field use record
Val at 0 range 0 .. 15;
Arr at 0 range 0 .. 15;
end record;
-- external interrupt configuration register 1
type EXTICR1_Register is record
-- EXTI x configuration (x = 0 to 3)
EXTI : EXTICR1_EXTI_Field :=
(As_Array => False, Val => 16#0#);
-- unspecified
Reserved_16_31 : HAL.Short := 16#0#;
end record
with Volatile_Full_Access, Size => 32,
Bit_Order => System.Low_Order_First;
for EXTICR1_Register use record
EXTI at 0 range 0 .. 15;
Reserved_16_31 at 0 range 16 .. 31;
end record;
----------------------
-- EXTICR2_Register --
----------------------
------------------
-- EXTICR2.EXTI --
------------------
-- EXTICR2_EXTI array element
subtype EXTICR2_EXTI_Element is HAL.UInt4;
-- EXTICR2_EXTI array
type EXTICR2_EXTI_Field_Array is array (4 .. 7) of EXTICR2_EXTI_Element
with Component_Size => 4, Size => 16;
-- Type definition for EXTICR2_EXTI
type EXTICR2_EXTI_Field
(As_Array : Boolean := False)
is record
case As_Array is
when False =>
-- EXTI as a value
Val : HAL.Short;
when True =>
-- EXTI as an array
Arr : EXTICR2_EXTI_Field_Array;
end case;
end record
with Unchecked_Union, Size => 16;
for EXTICR2_EXTI_Field use record
Val at 0 range 0 .. 15;
Arr at 0 range 0 .. 15;
end record;
-- external interrupt configuration register 2
type EXTICR2_Register is record
-- EXTI x configuration (x = 4 to 7)
EXTI : EXTICR2_EXTI_Field :=
(As_Array => False, Val => 16#0#);
-- unspecified
Reserved_16_31 : HAL.Short := 16#0#;
end record
with Volatile_Full_Access, Size => 32,
Bit_Order => System.Low_Order_First;
for EXTICR2_Register use record
EXTI at 0 range 0 .. 15;
Reserved_16_31 at 0 range 16 .. 31;
end record;
----------------------
-- EXTICR3_Register --
----------------------
------------------
-- EXTICR3.EXTI --
------------------
-- EXTICR3_EXTI array element
subtype EXTICR3_EXTI_Element is HAL.UInt4;
-- EXTICR3_EXTI array
type EXTICR3_EXTI_Field_Array is array (8 .. 11) of EXTICR3_EXTI_Element
with Component_Size => 4, Size => 16;
-- Type definition for EXTICR3_EXTI
type EXTICR3_EXTI_Field
(As_Array : Boolean := False)
is record
case As_Array is
when False =>
-- EXTI as a value
Val : HAL.Short;
when True =>
-- EXTI as an array
Arr : EXTICR3_EXTI_Field_Array;
end case;
end record
with Unchecked_Union, Size => 16;
for EXTICR3_EXTI_Field use record
Val at 0 range 0 .. 15;
Arr at 0 range 0 .. 15;
end record;
-- external interrupt configuration register 3
type EXTICR3_Register is record
-- EXTI x configuration (x = 8 to 11)
EXTI : EXTICR3_EXTI_Field :=
(As_Array => False, Val => 16#0#);
-- unspecified
Reserved_16_31 : HAL.Short := 16#0#;
end record
with Volatile_Full_Access, Size => 32,
Bit_Order => System.Low_Order_First;
for EXTICR3_Register use record
EXTI at 0 range 0 .. 15;
Reserved_16_31 at 0 range 16 .. 31;
end record;
----------------------
-- EXTICR4_Register --
----------------------
------------------
-- EXTICR4.EXTI --
------------------
-- EXTICR4_EXTI array element
subtype EXTICR4_EXTI_Element is HAL.UInt4;
-- EXTICR4_EXTI array
type EXTICR4_EXTI_Field_Array is array (12 .. 15) of EXTICR4_EXTI_Element
with Component_Size => 4, Size => 16;
-- Type definition for EXTICR4_EXTI
type EXTICR4_EXTI_Field
(As_Array : Boolean := False)
is record
case As_Array is
when False =>
-- EXTI as a value
Val : HAL.Short;
when True =>
-- EXTI as an array
Arr : EXTICR4_EXTI_Field_Array;
end case;
end record
with Unchecked_Union, Size => 16;
for EXTICR4_EXTI_Field use record
Val at 0 range 0 .. 15;
Arr at 0 range 0 .. 15;
end record;
-- external interrupt configuration register 4
type EXTICR4_Register is record
-- EXTI x configuration (x = 12 to 15)
EXTI : EXTICR4_EXTI_Field :=
(As_Array => False, Val => 16#0#);
-- unspecified
Reserved_16_31 : HAL.Short := 16#0#;
end record
with Volatile_Full_Access, Size => 32,
Bit_Order => System.Low_Order_First;
for EXTICR4_Register use record
EXTI at 0 range 0 .. 15;
Reserved_16_31 at 0 range 16 .. 31;
end record;
--------------------
-- CMPCR_Register --
--------------------
-- Compensation cell control register
type CMPCR_Register is record
-- Read-only. Compensation cell power-down
CMP_PD : Boolean;
-- unspecified
Reserved_1_7 : HAL.UInt7;
-- Read-only. READY
READY : Boolean;
-- unspecified
Reserved_9_31 : HAL.UInt23;
end record
with Volatile_Full_Access, Size => 32,
Bit_Order => System.Low_Order_First;
for CMPCR_Register use record
CMP_PD at 0 range 0 .. 0;
Reserved_1_7 at 0 range 1 .. 7;
READY at 0 range 8 .. 8;
Reserved_9_31 at 0 range 9 .. 31;
end record;
-----------------
-- Peripherals --
-----------------
-- System configuration controller
type SYSCFG_Peripheral is record
-- memory remap register
MEMRM : MEMRM_Register;
-- peripheral mode configuration register
PMC : PMC_Register;
-- external interrupt configuration register 1
EXTICR1 : EXTICR1_Register;
-- external interrupt configuration register 2
EXTICR2 : EXTICR2_Register;
-- external interrupt configuration register 3
EXTICR3 : EXTICR3_Register;
-- external interrupt configuration register 4
EXTICR4 : EXTICR4_Register;
-- Compensation cell control register
CMPCR : CMPCR_Register;
end record
with Volatile;
for SYSCFG_Peripheral use record
MEMRM at 0 range 0 .. 31;
PMC at 4 range 0 .. 31;
EXTICR1 at 8 range 0 .. 31;
EXTICR2 at 12 range 0 .. 31;
EXTICR3 at 16 range 0 .. 31;
EXTICR4 at 20 range 0 .. 31;
CMPCR at 32 range 0 .. 31;
end record;
-- System configuration controller
SYSCFG_Periph : aliased SYSCFG_Peripheral
with Import, Address => SYSCFG_Base;
end STM32_SVD.SYSCFG;
|
micahwelf/FLTK-Ada | Ada | 3,148 | adb |
with
Interfaces.C.Strings,
System;
use type
System.Address;
package body FLTK.Widgets.Inputs.Secret is
procedure secret_input_set_draw_hook
(W, D : in System.Address);
pragma Import (C, secret_input_set_draw_hook, "secret_input_set_draw_hook");
pragma Inline (secret_input_set_draw_hook);
procedure secret_input_set_handle_hook
(W, H : in System.Address);
pragma Import (C, secret_input_set_handle_hook, "secret_input_set_handle_hook");
pragma Inline (secret_input_set_handle_hook);
function new_fl_secret_input
(X, Y, W, H : in Interfaces.C.int;
Text : in Interfaces.C.char_array)
return System.Address;
pragma Import (C, new_fl_secret_input, "new_fl_secret_input");
pragma Inline (new_fl_secret_input);
procedure free_fl_secret_input
(F : in System.Address);
pragma Import (C, free_fl_secret_input, "free_fl_secret_input");
pragma Inline (free_fl_secret_input);
procedure fl_secret_input_draw
(W : in System.Address);
pragma Import (C, fl_secret_input_draw, "fl_secret_input_draw");
pragma Inline (fl_secret_input_draw);
function fl_secret_input_handle
(W : in System.Address;
E : in Interfaces.C.int)
return Interfaces.C.int;
pragma Import (C, fl_secret_input_handle, "fl_secret_input_handle");
pragma Inline (fl_secret_input_handle);
procedure Finalize
(This : in out Secret_Input) is
begin
if This.Void_Ptr /= System.Null_Address and then
This in Secret_Input'Class
then
free_fl_secret_input (This.Void_Ptr);
This.Void_Ptr := System.Null_Address;
end if;
Finalize (Input (This));
end Finalize;
package body Forge is
function Create
(X, Y, W, H : in Integer;
Text : in String)
return Secret_Input is
begin
return This : Secret_Input do
This.Void_Ptr := new_fl_secret_input
(Interfaces.C.int (X),
Interfaces.C.int (Y),
Interfaces.C.int (W),
Interfaces.C.int (H),
Interfaces.C.To_C (Text));
fl_widget_set_user_data
(This.Void_Ptr,
Widget_Convert.To_Address (This'Unchecked_Access));
secret_input_set_draw_hook (This.Void_Ptr, Draw_Hook'Address);
secret_input_set_handle_hook (This.Void_Ptr, Handle_Hook'Address);
end return;
end Create;
end Forge;
procedure Draw
(This : in out Secret_Input) is
begin
fl_secret_input_draw (This.Void_Ptr);
end Draw;
function Handle
(This : in out Secret_Input;
Event : in Event_Kind)
return Event_Outcome is
begin
return Event_Outcome'Val
(fl_secret_input_handle (This.Void_Ptr, Event_Kind'Pos (Event)));
end Handle;
end FLTK.Widgets.Inputs.Secret;
|
reznikmm/matreshka | Ada | 17,820 | 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.Elements;
with AMF.Internals.Element_Collections;
with AMF.Internals.Helpers;
with AMF.Internals.Tables.OCL_Attributes;
with AMF.UML.Comments.Collections;
with AMF.UML.Dependencies.Collections;
with AMF.UML.Elements.Collections;
with AMF.UML.Named_Elements;
with AMF.UML.Namespaces.Collections;
with AMF.UML.Packages.Collections;
with AMF.UML.States;
with AMF.UML.String_Expressions;
with AMF.UML.Types;
with AMF.Visitors.OCL_Iterators;
with AMF.Visitors.OCL_Visitors;
with League.Strings.Internals;
with Matreshka.Internals.Strings;
package body AMF.Internals.OCL_State_Exps is
------------------------
-- Get_Referred_State --
------------------------
overriding function Get_Referred_State
(Self : not null access constant OCL_State_Exp_Proxy)
return AMF.UML.States.UML_State_Access is
begin
return
AMF.UML.States.UML_State_Access
(AMF.Internals.Helpers.To_Element
(AMF.Internals.Tables.OCL_Attributes.Internal_Get_Referred_State
(Self.Element)));
end Get_Referred_State;
------------------------
-- Set_Referred_State --
------------------------
overriding procedure Set_Referred_State
(Self : not null access OCL_State_Exp_Proxy;
To : AMF.UML.States.UML_State_Access) is
begin
AMF.Internals.Tables.OCL_Attributes.Internal_Set_Referred_State
(Self.Element,
AMF.Internals.Helpers.To_Element
(AMF.Elements.Element_Access (To)));
end Set_Referred_State;
--------------
-- Get_Type --
--------------
overriding function Get_Type
(Self : not null access constant OCL_State_Exp_Proxy)
return AMF.UML.Types.UML_Type_Access is
begin
return
AMF.UML.Types.UML_Type_Access
(AMF.Internals.Helpers.To_Element
(AMF.Internals.Tables.OCL_Attributes.Internal_Get_Type
(Self.Element)));
end Get_Type;
--------------
-- Set_Type --
--------------
overriding procedure Set_Type
(Self : not null access OCL_State_Exp_Proxy;
To : AMF.UML.Types.UML_Type_Access) is
begin
AMF.Internals.Tables.OCL_Attributes.Internal_Set_Type
(Self.Element,
AMF.Internals.Helpers.To_Element
(AMF.Elements.Element_Access (To)));
end Set_Type;
---------------------------
-- Get_Client_Dependency --
---------------------------
overriding function Get_Client_Dependency
(Self : not null access constant OCL_State_Exp_Proxy)
return AMF.UML.Dependencies.Collections.Set_Of_UML_Dependency is
begin
return
AMF.UML.Dependencies.Collections.Wrap
(AMF.Internals.Element_Collections.Wrap
(AMF.Internals.Tables.OCL_Attributes.Internal_Get_Client_Dependency
(Self.Element)));
end Get_Client_Dependency;
--------------
-- Get_Name --
--------------
overriding function Get_Name
(Self : not null access constant OCL_State_Exp_Proxy)
return AMF.Optional_String is
begin
declare
use type Matreshka.Internals.Strings.Shared_String_Access;
Aux : constant Matreshka.Internals.Strings.Shared_String_Access
:= AMF.Internals.Tables.OCL_Attributes.Internal_Get_Name (Self.Element);
begin
if Aux = null then
return (Is_Empty => True);
else
return (False, League.Strings.Internals.Create (Aux));
end if;
end;
end Get_Name;
--------------
-- Set_Name --
--------------
overriding procedure Set_Name
(Self : not null access OCL_State_Exp_Proxy;
To : AMF.Optional_String) is
begin
if To.Is_Empty then
AMF.Internals.Tables.OCL_Attributes.Internal_Set_Name
(Self.Element, null);
else
AMF.Internals.Tables.OCL_Attributes.Internal_Set_Name
(Self.Element,
League.Strings.Internals.Internal (To.Value));
end if;
end Set_Name;
-------------------------
-- Get_Name_Expression --
-------------------------
overriding function Get_Name_Expression
(Self : not null access constant OCL_State_Exp_Proxy)
return AMF.UML.String_Expressions.UML_String_Expression_Access is
begin
return
AMF.UML.String_Expressions.UML_String_Expression_Access
(AMF.Internals.Helpers.To_Element
(AMF.Internals.Tables.OCL_Attributes.Internal_Get_Name_Expression
(Self.Element)));
end Get_Name_Expression;
-------------------------
-- Set_Name_Expression --
-------------------------
overriding procedure Set_Name_Expression
(Self : not null access OCL_State_Exp_Proxy;
To : AMF.UML.String_Expressions.UML_String_Expression_Access) is
begin
AMF.Internals.Tables.OCL_Attributes.Internal_Set_Name_Expression
(Self.Element,
AMF.Internals.Helpers.To_Element
(AMF.Elements.Element_Access (To)));
end Set_Name_Expression;
-------------------
-- Get_Namespace --
-------------------
overriding function Get_Namespace
(Self : not null access constant OCL_State_Exp_Proxy)
return AMF.UML.Namespaces.UML_Namespace_Access is
begin
return
AMF.UML.Namespaces.UML_Namespace_Access
(AMF.Internals.Helpers.To_Element
(AMF.Internals.Tables.OCL_Attributes.Internal_Get_Namespace
(Self.Element)));
end Get_Namespace;
------------------------
-- Get_Qualified_Name --
------------------------
overriding function Get_Qualified_Name
(Self : not null access constant OCL_State_Exp_Proxy)
return AMF.Optional_String is
begin
declare
use type Matreshka.Internals.Strings.Shared_String_Access;
Aux : constant Matreshka.Internals.Strings.Shared_String_Access
:= AMF.Internals.Tables.OCL_Attributes.Internal_Get_Qualified_Name (Self.Element);
begin
if Aux = null then
return (Is_Empty => True);
else
return (False, League.Strings.Internals.Create (Aux));
end if;
end;
end Get_Qualified_Name;
--------------------
-- Get_Visibility --
--------------------
overriding function Get_Visibility
(Self : not null access constant OCL_State_Exp_Proxy)
return AMF.UML.Optional_UML_Visibility_Kind is
begin
return
AMF.Internals.Tables.OCL_Attributes.Internal_Get_Visibility
(Self.Element);
end Get_Visibility;
--------------------
-- Set_Visibility --
--------------------
overriding procedure Set_Visibility
(Self : not null access OCL_State_Exp_Proxy;
To : AMF.UML.Optional_UML_Visibility_Kind) is
begin
AMF.Internals.Tables.OCL_Attributes.Internal_Set_Visibility
(Self.Element, To);
end Set_Visibility;
-----------------------
-- Get_Owned_Comment --
-----------------------
overriding function Get_Owned_Comment
(Self : not null access constant OCL_State_Exp_Proxy)
return AMF.UML.Comments.Collections.Set_Of_UML_Comment is
begin
return
AMF.UML.Comments.Collections.Wrap
(AMF.Internals.Element_Collections.Wrap
(AMF.Internals.Tables.OCL_Attributes.Internal_Get_Owned_Comment
(Self.Element)));
end Get_Owned_Comment;
-----------------------
-- Get_Owned_Element --
-----------------------
overriding function Get_Owned_Element
(Self : not null access constant OCL_State_Exp_Proxy)
return AMF.UML.Elements.Collections.Set_Of_UML_Element is
begin
return
AMF.UML.Elements.Collections.Wrap
(AMF.Internals.Element_Collections.Wrap
(AMF.Internals.Tables.OCL_Attributes.Internal_Get_Owned_Element
(Self.Element)));
end Get_Owned_Element;
---------------
-- Get_Owner --
---------------
overriding function Get_Owner
(Self : not null access constant OCL_State_Exp_Proxy)
return AMF.UML.Elements.UML_Element_Access is
begin
return
AMF.UML.Elements.UML_Element_Access
(AMF.Internals.Helpers.To_Element
(AMF.Internals.Tables.OCL_Attributes.Internal_Get_Owner
(Self.Element)));
end Get_Owner;
--------------------
-- All_Namespaces --
--------------------
overriding function All_Namespaces
(Self : not null access constant OCL_State_Exp_Proxy)
return AMF.UML.Namespaces.Collections.Ordered_Set_Of_UML_Namespace is
begin
-- Generated stub: replace with real body!
pragma Compile_Time_Warning (Standard.True, "All_Namespaces unimplemented");
raise Program_Error with "Unimplemented procedure OCL_State_Exp_Proxy.All_Namespaces";
return All_Namespaces (Self);
end All_Namespaces;
-------------------------
-- All_Owning_Packages --
-------------------------
overriding function All_Owning_Packages
(Self : not null access constant OCL_State_Exp_Proxy)
return AMF.UML.Packages.Collections.Set_Of_UML_Package is
begin
-- Generated stub: replace with real body!
pragma Compile_Time_Warning (Standard.True, "All_Owning_Packages unimplemented");
raise Program_Error with "Unimplemented procedure OCL_State_Exp_Proxy.All_Owning_Packages";
return All_Owning_Packages (Self);
end All_Owning_Packages;
-----------------------------
-- Is_Distinguishable_From --
-----------------------------
overriding function Is_Distinguishable_From
(Self : not null access constant OCL_State_Exp_Proxy;
N : AMF.UML.Named_Elements.UML_Named_Element_Access;
Ns : AMF.UML.Namespaces.UML_Namespace_Access)
return Boolean is
begin
-- Generated stub: replace with real body!
pragma Compile_Time_Warning (Standard.True, "Is_Distinguishable_From unimplemented");
raise Program_Error with "Unimplemented procedure OCL_State_Exp_Proxy.Is_Distinguishable_From";
return Is_Distinguishable_From (Self, N, Ns);
end Is_Distinguishable_From;
---------------
-- Namespace --
---------------
overriding function Namespace
(Self : not null access constant OCL_State_Exp_Proxy)
return AMF.UML.Namespaces.UML_Namespace_Access is
begin
-- Generated stub: replace with real body!
pragma Compile_Time_Warning (Standard.True, "Namespace unimplemented");
raise Program_Error with "Unimplemented procedure OCL_State_Exp_Proxy.Namespace";
return Namespace (Self);
end Namespace;
--------------------
-- Qualified_Name --
--------------------
overriding function Qualified_Name
(Self : not null access constant OCL_State_Exp_Proxy)
return League.Strings.Universal_String is
begin
-- Generated stub: replace with real body!
pragma Compile_Time_Warning (Standard.True, "Qualified_Name unimplemented");
raise Program_Error with "Unimplemented procedure OCL_State_Exp_Proxy.Qualified_Name";
return Qualified_Name (Self);
end Qualified_Name;
---------------
-- Separator --
---------------
overriding function Separator
(Self : not null access constant OCL_State_Exp_Proxy)
return League.Strings.Universal_String is
begin
-- Generated stub: replace with real body!
pragma Compile_Time_Warning (Standard.True, "Separator unimplemented");
raise Program_Error with "Unimplemented procedure OCL_State_Exp_Proxy.Separator";
return Separator (Self);
end Separator;
------------------------
-- All_Owned_Elements --
------------------------
overriding function All_Owned_Elements
(Self : not null access constant OCL_State_Exp_Proxy)
return AMF.UML.Elements.Collections.Set_Of_UML_Element is
begin
-- Generated stub: replace with real body!
pragma Compile_Time_Warning (Standard.True, "All_Owned_Elements unimplemented");
raise Program_Error with "Unimplemented procedure OCL_State_Exp_Proxy.All_Owned_Elements";
return All_Owned_Elements (Self);
end All_Owned_Elements;
-------------------
-- Must_Be_Owned --
-------------------
overriding function Must_Be_Owned
(Self : not null access constant OCL_State_Exp_Proxy)
return Boolean is
begin
-- Generated stub: replace with real body!
pragma Compile_Time_Warning (Standard.True, "Must_Be_Owned unimplemented");
raise Program_Error with "Unimplemented procedure OCL_State_Exp_Proxy.Must_Be_Owned";
return Must_Be_Owned (Self);
end Must_Be_Owned;
-------------------
-- Enter_Element --
-------------------
overriding procedure Enter_Element
(Self : not null access constant OCL_State_Exp_Proxy;
Visitor : in out AMF.Visitors.Abstract_Visitor'Class;
Control : in out AMF.Visitors.Traverse_Control) is
begin
if Visitor in AMF.Visitors.OCL_Visitors.OCL_Visitor'Class then
AMF.Visitors.OCL_Visitors.OCL_Visitor'Class
(Visitor).Enter_State_Exp
(AMF.OCL.State_Exps.OCL_State_Exp_Access (Self),
Control);
end if;
end Enter_Element;
-------------------
-- Leave_Element --
-------------------
overriding procedure Leave_Element
(Self : not null access constant OCL_State_Exp_Proxy;
Visitor : in out AMF.Visitors.Abstract_Visitor'Class;
Control : in out AMF.Visitors.Traverse_Control) is
begin
if Visitor in AMF.Visitors.OCL_Visitors.OCL_Visitor'Class then
AMF.Visitors.OCL_Visitors.OCL_Visitor'Class
(Visitor).Leave_State_Exp
(AMF.OCL.State_Exps.OCL_State_Exp_Access (Self),
Control);
end if;
end Leave_Element;
-------------------
-- Visit_Element --
-------------------
overriding procedure Visit_Element
(Self : not null access constant OCL_State_Exp_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.OCL_Iterators.OCL_Iterator'Class then
AMF.Visitors.OCL_Iterators.OCL_Iterator'Class
(Iterator).Visit_State_Exp
(Visitor,
AMF.OCL.State_Exps.OCL_State_Exp_Access (Self),
Control);
end if;
end Visit_Element;
end AMF.Internals.OCL_State_Exps;
|
Rodeo-McCabe/orka | Ada | 990 | 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.
with Ahven.Framework;
package Test_SIMD_SSE4_1_Math is
type Test is new Ahven.Framework.Test_Case with null record;
overriding
procedure Initialize (T : in out Test);
private
procedure Test_Nearest_Integer;
procedure Test_Floor;
procedure Test_Ceil;
procedure Test_Truncate;
end Test_SIMD_SSE4_1_Math;
|
reznikmm/matreshka | Ada | 4,704 | 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_Chart.Error_Lower_Indicator_Attributes is
------------
-- Create --
------------
overriding function Create
(Parameters : not null access Matreshka.DOM_Attributes.Attribute_L2_Parameters)
return Chart_Error_Lower_Indicator_Attribute_Node is
begin
return Self : Chart_Error_Lower_Indicator_Attribute_Node do
Matreshka.ODF_Chart.Constructors.Initialize
(Self'Unchecked_Access,
Parameters.Document,
Matreshka.ODF_String_Constants.Chart_Prefix);
end return;
end Create;
--------------------
-- Get_Local_Name --
--------------------
overriding function Get_Local_Name
(Self : not null access constant Chart_Error_Lower_Indicator_Attribute_Node)
return League.Strings.Universal_String
is
pragma Unreferenced (Self);
begin
return Matreshka.ODF_String_Constants.Error_Lower_Indicator_Attribute;
end Get_Local_Name;
begin
Matreshka.DOM_Documents.Register_Attribute
(Matreshka.ODF_String_Constants.Chart_URI,
Matreshka.ODF_String_Constants.Error_Lower_Indicator_Attribute,
Chart_Error_Lower_Indicator_Attribute_Node'Tag);
end Matreshka.ODF_Chart.Error_Lower_Indicator_Attributes;
|
AdaCore/gpr | Ada | 80 | adb | package body Pkg2 is
procedure P is
begin
null;
end P;
end Pkg2;
|
reznikmm/matreshka | Ada | 3,699 | 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.Text_Chapter_Attributes is
pragma Preelaborate;
type ODF_Text_Chapter_Attribute is limited interface
and XML.DOM.Attributes.DOM_Attribute;
type ODF_Text_Chapter_Attribute_Access is
access all ODF_Text_Chapter_Attribute'Class
with Storage_Size => 0;
end ODF.DOM.Text_Chapter_Attributes;
|
reznikmm/matreshka | Ada | 3,971 | 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.Style_Class_Attributes;
package Matreshka.ODF_Style.Class_Attributes is
type Style_Class_Attribute_Node is
new Matreshka.ODF_Style.Abstract_Style_Attribute_Node
and ODF.DOM.Style_Class_Attributes.ODF_Style_Class_Attribute
with null record;
overriding function Create
(Parameters : not null access Matreshka.DOM_Attributes.Attribute_L2_Parameters)
return Style_Class_Attribute_Node;
overriding function Get_Local_Name
(Self : not null access constant Style_Class_Attribute_Node)
return League.Strings.Universal_String;
end Matreshka.ODF_Style.Class_Attributes;
|
twdroeger/ada-awa | Ada | 20,142 | adb | -----------------------------------------------------------------------
-- awa-commands -- AWA commands for server or admin tool
-- Copyright (C) 2019, 2020 Stephane Carrez
-- Written by Stephane Carrez ([email protected])
--
-- Licensed under the Apache License, Version 2.0 (the "License");
-- you may not use this file except in compliance with the License.
-- You may obtain a copy of the License at
--
-- http://www.apache.org/licenses/LICENSE-2.0
--
-- Unless required by applicable law or agreed to in writing, software
-- distributed under the License is distributed on an "AS IS" BASIS,
-- WITHOUT WARRANTIES OR CONDITIONS OF ANY KIND, either express or implied.
-- See the License for the specific language governing permissions and
-- limitations under the License.
-----------------------------------------------------------------------
with Ada.IO_Exceptions;
with Ada.Command_Line;
with Ada.Unchecked_Deallocation;
with Ada.Strings.Unbounded;
with Util.Log.Loggers;
with Util.Properties;
with Util.Strings.Tokenizers;
with Util.Strings.Vectors;
with AWA.Applications.Configs;
with Keystore.Passwords.Input;
with Keystore.Passwords.Files;
with Keystore.Passwords.Unsafe;
with Keystore.Passwords.Cmds;
package body AWA.Commands is
use Ada.Strings.Unbounded;
use type Keystore.Passwords.Provider_Access;
use type Keystore.Header_Slot_Count_Type;
use type Keystore.Passwords.Keys.Key_Provider_Access;
Log : constant Util.Log.Loggers.Logger := Util.Log.Loggers.Create ("AWA.Commands");
procedure Load_Configuration (Context : in out Context_Type;
Path : in String) is
begin
begin
Context.File_Config.Load_Properties (Path);
Util.Log.Loggers.Initialize (Util.Properties.Manager (Context.File_Config));
exception
when Ada.IO_Exceptions.Name_Error =>
Log.Error ("Cannot read server configuration file '{0}'",
Path);
end;
if Context.File_Config.Exists (GPG_CRYPT_CONFIG) then
Context.GPG.Set_Encrypt_Command (Context.File_Config.Get (GPG_CRYPT_CONFIG));
end if;
if Context.File_Config.Exists (GPG_DECRYPT_CONFIG) then
Context.GPG.Set_Decrypt_Command (Context.File_Config.Get (GPG_DECRYPT_CONFIG));
end if;
if Context.File_Config.Exists (GPG_LIST_CONFIG) then
Context.GPG.Set_List_Key_Command (Context.File_Config.Get (GPG_LIST_CONFIG));
end if;
Context.Config.Randomize := not Context.Zero;
end Load_Configuration;
-- ------------------------------
-- Returns True if a keystore is used by the configuration and must be unlocked.
-- ------------------------------
function Use_Keystore (Context : in Context_Type) return Boolean is
begin
if Context.Wallet_File'Length > 0 then
return True;
end if;
return Context.File_Config.Exists ("keystore.path");
end Use_Keystore;
-- ------------------------------
-- Open the keystore file using the password password.
-- ------------------------------
procedure Open_Keystore (Context : in out Context_Type) is
begin
Setup_Password_Provider (Context);
Setup_Key_Provider (Context);
Context.Wallet.Open (Path => Context.Get_Keystore_Path,
Data_Path => Context.Data_Path.all,
Config => Context.Config,
Info => Context.Info);
if not Context.No_Password_Opt or else Context.Info.Header_Count = 0 then
if Context.Key_Provider /= null then
Context.Wallet.Set_Master_Key (Context.Key_Provider.all);
end if;
if Context.Provider = null then
Context.Provider := Keystore.Passwords.Input.Create (-("Enter password: "), False);
end if;
Context.Wallet.Unlock (Context.Provider.all, Context.Slot);
else
Context.GPG.Load_Secrets (Context.Wallet);
Context.Wallet.Set_Master_Key (Context.GPG);
Context.Wallet.Unlock (Context.GPG, Context.Slot);
end if;
Keystore.Properties.Initialize (Context.Secure_Config,
Context.Wallet'Unchecked_Access);
AWA.Applications.Configs.Merge (Context.App_Config,
Context.File_Config,
Context.Secure_Config,
"");
end Open_Keystore;
-- ------------------------------
-- Configure the application by loading its configuration file and merging it with
-- the keystore file if there is one.
-- ------------------------------
procedure Configure (Application : in out AWA.Applications.Application'Class;
Name : in String;
Context : in out Context_Type) is
Path : constant String := AWA.Applications.Configs.Get_Config_Path (Name);
begin
begin
Context.File_Config.Load_Properties (Path);
exception
when Ada.IO_Exceptions.Name_Error =>
null;
end;
if Context.Use_Keystore then
Open_Keystore (Context);
else
Context.App_Config := Context.File_Config;
end if;
Application.Initialize (Context.App_Config, Context.Factory);
end Configure;
-- ------------------------------
-- Initialize the commands.
-- ------------------------------
overriding
procedure Initialize (Context : in out Context_Type) is
begin
GC.Set_Usage (Config => Context.Command_Config,
Usage => "[switchs] command [arguments]",
Help => -("akt - tool to store and protect your sensitive data"));
GC.Define_Switch (Config => Context.Command_Config,
Output => Context.Version'Access,
Switch => "-V",
Long_Switch => "--version",
Help => -("Print the version"));
GC.Define_Switch (Config => Context.Command_Config,
Output => Context.Verbose'Access,
Switch => "-v",
Long_Switch => "--verbose",
Help => -("Verbose execution mode"));
GC.Define_Switch (Config => Context.Command_Config,
Output => Context.Debug'Access,
Switch => "-vv",
Long_Switch => "--debug",
Help => -("Enable debug execution"));
GC.Define_Switch (Config => Context.Command_Config,
Output => Context.Dump'Access,
Switch => "-vvv",
Long_Switch => "--debug-dump",
Help => -("Enable debug dump execution"));
GC.Define_Switch (Config => Context.Command_Config,
Output => Context.Zero'Access,
Switch => "-z",
Long_Switch => "--zero",
Help => -("Erase and fill with zeros instead of random values"));
GC.Define_Switch (Config => Context.Command_Config,
Output => Context.Config_File'Access,
Switch => "-c:",
Long_Switch => "--config=",
Argument => "PATH",
Help => -("Defines the path for configuration file"));
GC.Initialize_Option_Scan (Stop_At_First_Non_Switch => True);
-- Driver.Set_Description (-("akt - tool to store and protect your sensitive data"));
-- Driver.Set_Usage (-("[-V] [-v] [-vv] [-vvv] [-c path] [-t count] [-z] " &
-- "<command> [<args>]" & ASCII.LF &
-- "where:" & ASCII.LF &
-- " -V Print the tool version" & ASCII.LF &
-- " -v Verbose execution mode" & ASCII.LF &
-- " -vv Debug execution mode" & ASCII.LF &
-- " -vvv Dump execution mode" & ASCII.LF &
-- " -c path Defines the path for akt " &
-- "global configuration" & ASCII.LF &
-- " -t count Number of threads for the " &
-- "encryption/decryption process" & ASCII.LF &
-- " -z Erase and fill with zeros instead of random values"));
-- Driver.Add_Command ("help",
-- -("print some help"),
-- Help_Command'Access);
end Initialize;
-- ------------------------------
-- Setup the command before parsing the arguments and executing it.
-- ------------------------------
procedure Setup_Command (Config : in out GC.Command_Line_Configuration;
Context : in out Context_Type) is
begin
GC.Define_Switch (Config => Config,
Output => Context.Wallet_File'Access,
Switch => "-k:",
Long_Switch => "--keystore=",
Argument => "PATH",
Help => -("Defines the path for the keystore file"));
GC.Define_Switch (Config => Config,
Output => Context.Data_Path'Access,
Switch => "-d:",
Long_Switch => "--data-path=",
Argument => "PATH",
Help => -("The directory which contains the keystore data blocks"));
GC.Define_Switch (Config => Config,
Output => Context.Password_File'Access,
Long_Switch => "--passfile=",
Argument => "PATH",
Help => -("Read the file that contains the password"));
GC.Define_Switch (Config => Config,
Output => Context.Unsafe_Password'Access,
Long_Switch => "--passfd=",
Argument => "NUM",
Help => -("Read the password from the pipe with"
& " the given file descriptor"));
GC.Define_Switch (Config => Config,
Output => Context.Unsafe_Password'Access,
Long_Switch => "--passsocket=",
Help => -("The password is passed within the socket connection"));
GC.Define_Switch (Config => Config,
Output => Context.Password_Env'Access,
Long_Switch => "--passenv=",
Argument => "NAME",
Help => -("Read the environment variable that contains"
& " the password (not safe)"));
GC.Define_Switch (Config => Config,
Output => Context.Unsafe_Password'Access,
Switch => "-p:",
Long_Switch => "--password=",
Help => -("The password is passed within the command line (not safe)"));
GC.Define_Switch (Config => Config,
Output => Context.Password_Askpass'Access,
Long_Switch => "--passask",
Help => -("Run the ssh-askpass command to get the password"));
GC.Define_Switch (Config => Config,
Output => Context.Password_Command'Access,
Long_Switch => "--passcmd=",
Argument => "COMMAND",
Help => -("Run the command to get the password"));
GC.Define_Switch (Config => Config,
Output => Context.Wallet_Key_File'Access,
Long_Switch => "--wallet-key-file=",
Argument => "PATH",
Help => -("Read the file that contains the wallet keys"));
end Setup_Command;
procedure Setup_Password_Provider (Context : in out Context_Type) is
begin
if Context.Password_Askpass then
Context.Provider := Keystore.Passwords.Cmds.Create ("ssh-askpass");
elsif Context.Password_Command'Length > 0 then
Context.Provider := Keystore.Passwords.Cmds.Create (Context.Password_Command.all);
elsif Context.Password_File'Length > 0 then
Context.Provider := Keystore.Passwords.Files.Create (Context.Password_File.all);
elsif Context.Password_Command'Length > 0 then
Context.Provider := Keystore.Passwords.Cmds.Create (Context.Password_Command.all);
elsif Context.Unsafe_Password'Length > 0 then
Context.Provider := Keystore.Passwords.Unsafe.Create (Context.Unsafe_Password.all);
else
Context.No_Password_Opt := True;
end if;
Context.Key_Provider := Keystore.Passwords.Keys.Create (Keystore.DEFAULT_WALLET_KEY);
end Setup_Password_Provider;
procedure Setup_Key_Provider (Context : in out Context_Type) is
begin
if Context.Wallet_Key_File'Length > 0 then
Context.Key_Provider := Keystore.Passwords.Files.Create (Context.Wallet_Key_File.all);
end if;
end Setup_Key_Provider;
-- ------------------------------
-- Get the keystore file path.
-- ------------------------------
function Get_Keystore_Path (Context : in out Context_Type) return String is
begin
if Context.Wallet_File'Length > 0 then
Context.First_Arg := 1;
return Context.Wallet_File.all;
else
raise Error with "No keystore path";
end if;
end Get_Keystore_Path;
procedure Print (Context : in out Context_Type;
Ex : in Ada.Exceptions.Exception_Occurrence) is
begin
Ada.Exceptions.Reraise_Occurrence (Ex);
exception
when GNAT.Command_Line.Exit_From_Command_Line | GNAT.Command_Line.Invalid_Switch =>
Ada.Command_Line.Set_Exit_Status (Ada.Command_Line.Failure);
when Keystore.Bad_Password =>
Log.Error (-("Invalid password to unlock the keystore file"));
Ada.Command_Line.Set_Exit_Status (Ada.Command_Line.Failure);
when Keystore.No_Key_Slot =>
Log.Error (-("There is no available key slot to add the password"));
Ada.Command_Line.Set_Exit_Status (Ada.Command_Line.Failure);
when Keystore.No_Content =>
Log.Error (-("No content for an item of type wallet"));
Ada.Command_Line.Set_Exit_Status (Ada.Command_Line.Failure);
when Keystore.Corrupted =>
Log.Error (-("The keystore file is corrupted: invalid meta data content"));
Ada.Command_Line.Set_Exit_Status (Ada.Command_Line.Failure);
when Keystore.Invalid_Block =>
Log.Error (-("The keystore file is corrupted: invalid data block headers or signature"));
Ada.Command_Line.Set_Exit_Status (Ada.Command_Line.Failure);
when Keystore.Invalid_Signature =>
Log.Error (-("The keystore file is corrupted: invalid signature"));
Ada.Command_Line.Set_Exit_Status (Ada.Command_Line.Failure);
when Keystore.Invalid_Storage =>
Log.Error (-("The keystore file is corrupted: invalid or missing storage file"));
Ada.Command_Line.Set_Exit_Status (Ada.Command_Line.Failure);
when Keystore.Invalid_Keystore =>
Log.Error (-("The file is not a keystore"));
Ada.Command_Line.Set_Exit_Status (Ada.Command_Line.Failure);
when AWA.Commands.Error | Util.Commands.Not_Found =>
Ada.Command_Line.Set_Exit_Status (Ada.Command_Line.Failure);
when E : Ada.IO_Exceptions.Name_Error =>
Log.Error (-("Cannot access file: {0}"), Ada.Exceptions.Exception_Message (E));
Ada.Command_Line.Set_Exit_Status (Ada.Command_Line.Failure);
when E : others =>
Log.Error (-("Some internal error occurred"), E);
Ada.Command_Line.Set_Exit_Status (Ada.Command_Line.Failure);
end Print;
-- ------------------------------
-- Configure the logs.
-- ------------------------------
procedure Configure_Logs (Root : in String;
Debug : in Boolean;
Dump : in Boolean;
Verbose : in Boolean) is
procedure Split (Item : in String;
Done : out Boolean);
function Make_Root (Level : in String;
Appender1 : in String;
Appender2 : in String) return String;
Start : constant Natural := Util.Strings.Index (Root, ',');
List : Util.Strings.Vectors.Vector;
procedure Split (Item : in String;
Done : out Boolean) is
begin
Done := False;
List.Append (Item);
end Split;
function Make_Root (Level : in String;
Appender1 : in String;
Appender2 : in String) return String is
Result : Unbounded_String;
begin
Append (Result, Level);
Append (Result, ",");
if not List.Contains (Appender1) then
Append (Result, Appender1);
end if;
if Appender2'Length > 0 and then not List.Contains (Appender2) then
Append (Result, ",");
Append (Result, Appender2);
end if;
for Item of List loop
Append (Result, ",");
Append (Result, Item);
end loop;
return To_String (Result);
end Make_Root;
Log_Config : Util.Properties.Manager;
begin
if Start > 0 then
Util.Strings.Tokenizers.Iterate_Tokens (Root (Start + 1 .. Root'Last),
",", Split'Access);
end if;
Log_Config.Set ("log4j.rootCategory", Make_Root ("DEBUG", "console", ""));
Log_Config.Set ("log4j.appender.console", "Console");
Log_Config.Set ("log4j.appender.console.level", "ERROR");
Log_Config.Set ("log4j.appender.console.layout", "message");
Log_Config.Set ("log4j.appender.console.stderr", "true");
Log_Config.Set ("log4j.logger.Util", "FATAL");
Log_Config.Set ("log4j.logger.log", "ERROR");
if Verbose or Debug or Dump then
Log_Config.Set ("log4j.logger.log", "INFO");
Log_Config.Set ("log4j.logger.Util", "WARN");
Log_Config.Set ("log4j.logger.Keystore.IO", "WARN");
Log_Config.Set ("log4j.logger.ADO.Sessions", "WARN");
Log_Config.Set ("log4j.rootCategory", Make_Root ("DEBUG", "console", "verbose"));
Log_Config.Set ("log4j.appender.verbose", "Console");
Log_Config.Set ("log4j.appender.verbose.level", "INFO");
Log_Config.Set ("log4j.appender.verbose.layout", "level-message");
end if;
if Debug or Dump then
Log_Config.Set ("log4j.logger.log", "INFO");
Log_Config.Set ("log4j.logger.Util.Processes", "INFO");
Log_Config.Set ("log4j.logger.Keystore.IO", "INFO");
Log_Config.Set ("log4j.logger.ADO", "INFO");
Log_Config.Set ("log4j.rootCategory", Make_Root ("DEBUG", "console", "debug"));
Log_Config.Set ("log4j.appender.debug", "Console");
Log_Config.Set ("log4j.appender.debug.level", "DEBUG");
Log_Config.Set ("log4j.appender.debug.layout", "full");
end if;
if Dump then
Log_Config.Set ("log4j.logger.Keystore.IO", "DEBUG");
Log_Config.Set ("log4j.logger.AWA", "DEBUG");
Log_Config.Set ("log4j.logger.ADO", "DEBUG");
Log_Config.Set ("log4j.logger.ADO.Sessions", "WARN");
end if;
Util.Log.Loggers.Initialize (Log_Config);
end Configure_Logs;
overriding
procedure Finalize (Context : in out Context_Type) is
procedure Free is
new Ada.Unchecked_Deallocation (Object => Keystore.Passwords.Provider'Class,
Name => Keystore.Passwords.Provider_Access);
begin
GC.Free (Context.Command_Config);
Free (Context.Provider);
end Finalize;
end AWA.Commands;
|
strenkml/EE368 | Ada | 7,629 | adb |
with Ada.Assertions; use Ada.Assertions;
with Device; use Device;
with Memory.Container; use Memory.Container;
with Memory.Transform; use Memory.Transform;
with Memory.Transform.Offset; use Memory.Transform.Offset;
with Memory.Transform.EOR; use Memory.Transform.EOR;
with Memory.Transform.Shift; use Memory.Transform.Shift;
with Memory.Transform.Flip; use Memory.Transform.Flip;
with Memory.Split; use Memory.Split;
with Memory.Join; use Memory.Join;
with Memory.SPM; use Memory.SPM;
with Util; use Util;
function Simplify_Memory(mem : Memory_Pointer) return Memory_Pointer is
function Needs_Split(ptr : Memory_Pointer;
offset : Address_Type) return Boolean is
tp : Memory_Pointer := ptr;
begin
while tp.all not in Join_Type'Class loop
if tp.all not in SPM_Type'Class then
return True;
end if;
declare
sp : constant SPM_Pointer := SPM_Pointer(tp);
size : constant Natural := Get_Size(sp.all);
begin
if Address_Type(size) > offset then
return True;
end if;
tp := Get_Memory(sp.all);
end;
end loop;
return False;
end Needs_Split;
procedure Replace_Join(bank : in Memory_Pointer;
next : in Memory_Pointer) is
last : Container_Pointer := null;
tp : Memory_Pointer := bank;
begin
while tp.all not in Join_Type'Class loop
last := Container_Pointer(tp);
tp := Get_Memory(last.all);
end loop;
Set_Memory(last.all, next);
Destroy(tp);
end Replace_Join;
function Simplify_Split(ptr : Split_Pointer) return Memory_Pointer is
sp : Split_Pointer := ptr;
b0 : Memory_Pointer := Get_Bank(sp.all, 0);
b1 : Memory_Pointer := Get_Bank(sp.all, 1);
n : Memory_Pointer := Get_Memory(sp.all);
o : constant Address_Type := Get_Offset(sp.all);
abits : constant Natural := Get_Address_Bits;
begin
b0 := Simplify_Memory(b0);
Set_Bank(sp.all, 0, b0);
b1 := Simplify_Memory(b1);
Set_Bank(sp.all, 1, b1);
n := Simplify_Memory(n);
if b0.all in Join_Type'Class and b1.all in Join_Type'Class then
-- Empty split; remove it.
Set_Memory(sp.all, null);
Destroy(Memory_Pointer(sp));
return n;
elsif b0.all in Join_Type'Class and then
not Needs_Split(b1, Address_Type'Last) then
-- Split used as an offset; convert to an offset with a bank.
declare
op : constant Offset_Pointer := Create_Offset;
jp : constant Join_Pointer := Find_Join(b1);
begin
Set_Bank(sp.all, 1, null);
Set_Memory(sp.all, null);
Set_Parent(jp.all, op);
Set_Bank(op.all, b1);
Set_Memory(op.all, n);
Destroy(Memory_Pointer(sp));
if (o and Address_Type(2) ** (abits - 1)) = 0 then
Set_Value(op.all, Long_Integer(o));
else
Set_Value(op.all, -Long_Integer(Address_Type(2) ** abits - o));
end if;
return Memory_Pointer(op);
end;
elsif b1.all in Join_Type'Class and then not Needs_Split(b0, o) then
-- Split not needed; remove it.
Set_Bank(sp.all, 0, null);
Set_Memory(sp.all, null);
Destroy(Memory_Pointer(sp));
Replace_Join(b0, n);
return b0;
else
Set_Memory(sp.all, n);
return Memory_Pointer(ptr);
end if;
end Simplify_Split;
function Is_Similar_Transform(a : Transform_Pointer;
b : Memory_Pointer) return Boolean is
begin
if a.all in Offset_Type'Class and b.all in Offset_Type'Class then
return True;
elsif a.all in EOR_Type'Class and b.all in EOR_Type'Class then
return True;
elsif a.all in Shift_Type'Class and b.all in Shift_Type'Class then
return True;
elsif a.all in Flip_Type'Class and b.all in Flip_Type'Class then
return True;
else
return False;
end if;
end Is_Similar_Transform;
function "xor"(a : Long_Integer; b : Long_Integer) return Long_Integer is
type MType is mod 2 ** Long_Integer'Size;
ma : constant MType := MType'Mod(a);
mb : constant MType := MType'Mod(b);
mr : constant MType := ma xor mb;
begin
if (mr and 2 ** (MType'Size - 1)) /= 0 then
return -Long_Integer(0 - mr);
else
return Long_Integer(mr);
end if;
end "xor";
function Combine_Transforms(a : Transform_Pointer;
b : Memory_Pointer) return Long_Integer is
va : constant Long_Integer := Get_Value(a.all);
tb : constant Transform_Pointer := Transform_Pointer(b);
vb : constant Long_Integer := Get_Value(tb.all);
begin
if a.all in Offset_Type'Class then
return va + vb;
elsif a.all in EOR_Type'Class then
return va xor vb;
elsif a.all in Shift_Type'Class then
return va + vb;
elsif a.all in Flip_Type'Class then
return 0;
else
Assert(False, "unhandled transform type in Combine_Transforms");
return 0;
end if;
end Combine_Transforms;
function Simplify_Transform(ptr : Transform_Pointer)
return Memory_Pointer is
tp : Transform_Pointer := ptr;
bank : Memory_Pointer := Get_Bank(tp.all);
next : Memory_Pointer := Get_Memory(tp.all);
begin
next := Simplify_Memory(next);
if bank /= null then
bank := Simplify_Memory(bank);
Set_Bank(tp.all, bank);
end if;
if bank = null and then Is_Similar_Transform(tp, next) then
declare
nt : Transform_Pointer := Transform_Pointer(next);
begin
Set_Value(tp.all, Combine_Transforms(tp, next));
next := Get_Memory(nt.all);
Set_Memory(nt.all, null);
Destroy(Memory_Pointer(nt));
Set_Memory(tp.all, next);
return Memory_Pointer(tp);
end;
end if;
if bank /= null and then bank.all in Join_Type'Class then
Set_Memory(tp.all, null);
Destroy(Memory_Pointer(tp));
return next;
end if;
if tp.Is_Empty then
if bank = null or else bank.all in Join_Type'Class then
Set_Memory(tp.all, null);
Destroy(Memory_Pointer(tp));
return next;
else
Set_Memory(tp.all, null);
Set_Bank(tp.all, null);
Destroy(Memory_Pointer(tp));
Replace_Join(bank, next);
return bank;
end if;
else
Set_Memory(tp.all, next);
return Memory_Pointer(ptr);
end if;
end Simplify_Transform;
begin
if mem.all in Split_Type'Class then
return Simplify_Split(Split_Pointer(mem));
elsif mem.all in Transform_Type'Class then
return Simplify_Transform(Transform_Pointer(mem));
elsif mem.all in Container_Type'Class then
declare
cp : constant Container_Pointer := Container_Pointer(mem);
n : Memory_Pointer := Get_Memory(cp.all);
begin
n := Simplify_Memory(n);
Set_Memory(cp.all, n);
return mem;
end;
else
return mem;
end if;
end Simplify_Memory;
|
stcarrez/ada-util | Ada | 3,422 | adb | -----------------------------------------------------------------------
-- csv_city -- Read CSV file which contains city mapping
-- Copyright (C) 2011, 2017, 2022 Stephane Carrez
-- Written by Stephane Carrez ([email protected])
--
-- Licensed under the Apache License, Version 2.0 (the "License");
-- you may not use this file except in compliance with the License.
-- You may obtain a copy of the License at
--
-- http://www.apache.org/licenses/LICENSE-2.0
--
-- Unless required by applicable law or agreed to in writing, software
-- distributed under the License is distributed on an "AS IS" BASIS,
-- WITHOUT WARRANTIES OR CONDITIONS OF ANY KIND, either express or implied.
-- See the License for the specific language governing permissions and
-- limitations under the License.
-----------------------------------------------------------------------
with Ada.Text_IO;
with Ada.Command_Line;
with Ada.Containers;
with Ada.Strings.Unbounded;
with Util.Log.Loggers;
with Util.Serialize.IO.CSV;
with Util.Serialize.Mappers;
with City_Mapping;
procedure CSV_City is
use Ada.Containers;
use Ada.Strings.Unbounded;
use Util.Serialize.IO.CSV;
Count : constant Natural := Ada.Command_Line.Argument_Count;
begin
Util.Log.Loggers.Initialize ("samples/log4j.properties");
if Count = 0 then
Ada.Text_IO.Put_Line ("Usage: csv_city file [city...]");
Ada.Text_IO.Put_Line ("Example: csv_city samples/cities.csv albertville");
return;
end if;
declare
File : constant String := Ada.Command_Line.Argument (1);
List : aliased City_Mapping.City_Vector.Vector;
Mapper : aliased Util.Serialize.Mappers.Processing;
Reader : Util.Serialize.IO.CSV.Parser;
begin
Mapper.Add_Mapping ("", City_Mapping.Get_City_Vector_Mapper.all'Access);
City_Mapping.City_Vector_Mapper.Set_Context (Mapper, List'Unchecked_Access);
Reader.Parse (File, Mapper);
if List.Length = 0 then
Ada.Text_IO.Put_Line ("No city found.");
elsif List.Length = 1 then
Ada.Text_IO.Put_Line ("Found only one city.");
else
Ada.Text_IO.Put_Line ("Found " & Count_Type'Image (List.Length) & " cities");
end if;
for I in 2 .. Count loop
declare
Name : constant String := Ada.Command_Line.Argument (I);
Found : Boolean := False;
procedure Print (City : in City_Mapping.City);
procedure Print (City : in City_Mapping.City) is
begin
Found := City.City = Name;
if Found then
Ada.Text_IO.Put_Line ("City : " & To_String (City.Name));
Ada.Text_IO.Put_Line ("Country code: " & To_String (City.Country));
Ada.Text_IO.Put_Line ("Region : " & To_String (City.Region));
Ada.Text_IO.Put_Line ("Latitude : " & Float'Image (City.Latitude));
Ada.Text_IO.Put_Line ("Longitude : " & Float'Image (City.Longitude));
end if;
end Print;
begin
for J in 1 .. Positive (List.Length) loop
List.Query_Element (J, Print'Access);
exit when Found;
end loop;
if not Found then
Ada.Text_IO.Put_Line ("City '" & Name & "' not found");
end if;
end;
end loop;
end;
end CSV_City;
|
reznikmm/matreshka | Ada | 4,766 | 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.Presentation_Sound_Elements;
package Matreshka.ODF_Presentation.Sound_Elements is
type Presentation_Sound_Element_Node is
new Matreshka.ODF_Presentation.Abstract_Presentation_Element_Node
and ODF.DOM.Presentation_Sound_Elements.ODF_Presentation_Sound
with null record;
overriding function Create
(Parameters : not null access Matreshka.DOM_Elements.Element_L2_Parameters)
return Presentation_Sound_Element_Node;
overriding function Get_Local_Name
(Self : not null access constant Presentation_Sound_Element_Node)
return League.Strings.Universal_String;
overriding procedure Enter_Node
(Self : not null access Presentation_Sound_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 Presentation_Sound_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 Presentation_Sound_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_Presentation.Sound_Elements;
|
reznikmm/matreshka | Ada | 3,351 | ads | ------------------------------------------------------------------------------
-- --
-- Matreshka Project --
-- --
-- Examples Component --
-- --
------------------------------------------------------------------------------
-- --
-- Copyright © 2016-2019, 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 Spikedog.Generic_Application_Initializer;
package Startup.Hook is
new Spikedog.Generic_Application_Initializer
(Startup.Servlet_Container_Initializer);
|
johnperry-math/hac | Ada | 11,478 | ads | -------------------------------------------------------------------------------------
--
-- HAC - HAC Ada Compiler
--
-- A compiler in Ada for an Ada subset
--
-- Copyright, license, etc. : see top package.
--
-------------------------------------------------------------------------------------
--
with HAC_Sys.Defs;
package HAC_Sys.Parser.Helpers is
use Defs;
----------------------
-- Symbol testing --
----------------------
-- If needed symbol S is correct, consume it;
-- otherwise output error code E.
--
-- Optionally, we consume a symbol Forgive that
-- the programmer may have written instead of S.
-- For instance '[' instead of '('.
--
procedure Need (
CD : in out Compiler_Data;
S : KeyWSymbol;
E : Compile_Error;
Forgive : KeyWSymbol := Dummy_Symbol
);
-- Issue error N, then skip all subsequent symbols
-- that are not in the FSys set.
--
procedure Skip (
CD : in out Compiler_Data;
FSys : Symset;
N : Compile_Error;
hint : String := ""
);
-- Issue error N, then skip all subsequent symbols
-- that are not equal to S.
--
procedure Skip (
CD : in out Compiler_Data;
S : KeyWSymbol;
N : Compile_Error;
hint : String := ""
);
-- Test if current symbol is in the S1 set, otherwise
-- issue error N. If stop_on_error = False, we skip
-- subsequent symbols that are not in the union (S1 + S2).
--
procedure Test (
CD : in out Compiler_Data;
S1, S2 : Symset;
N : Compile_Error;
stop_on_error : Boolean := False);
procedure Test_Semicolon_in_Declaration (CD : in out Compiler_Data; FSys : Symset);
procedure Test_END_Symbol (CD : in out Compiler_Data);
procedure Check_Boolean (CD : in out Compiler_Data; T : Typen);
procedure Ignore_Extra_Semicolons (CD : in out Compiler_Data);
type Type_Conversion_Kind is (To_Float, To_Integer, To_Duration, Unknown);
procedure Argument_Type_Not_Supported (CD : in out Compiler_Data);
procedure Type_Mismatch (
CD : in out Compiler_Data;
Err : Compile_Error;
Found, Expected : Exact_Typ
);
procedure Type_Mismatch (
CD : in out Compiler_Data;
Err : Compile_Error;
Found : Exact_Typ;
Expected : Typ_Set
);
procedure Operator_Undefined (
CD : in out Compiler_Data;
Operator : KeyWSymbol;
Left, Right : Exact_Typ
);
-- https://en.wikipedia.org/wiki/Type_conversion#Implicit_type_conversion
-- One of the most useful feature of Ada is the absence of type coercion.
-- Note from the Python 2.5 doc:
-- "In Python 3.0, coercion will not be supported."
--
procedure Forbid_Type_Coercion (
CD : in out Compiler_Data;
Operator : KeyWSymbol;
Left, Right : Exact_Typ
);
procedure Forbid_Type_Coercion (
CD : in out Compiler_Data;
Found, Expected : Exact_Typ
);
No_Id : constant := 0;
------------------------------------
-- Symbol sets used for parsing --
------------------------------------
-- Singletons:
function Singleton (s : KeyWSymbol) return Symset;
pragma Inline (Singleton);
-- Specific singletons:
Becomes_Set : constant Symset := (Becomes => True, others => False);
Colon_Set : constant Symset := (Colon => True, others => False);
END_Set : constant Symset := (END_Symbol => True, others => False);
IDent_Set : constant Symset := (IDent => True, others => False);
RParent_Set : constant Symset := (RParent => True, others => False);
Semicolon_Set : constant Symset := (Semicolon => True, others => False);
-- Specific sets:
Alt_Finger_THEN : constant Symset :=
-- For "WHEN" in CASE statements ("THEN" is wrong,
-- but that error is processed specifically).
(Alt | Finger | THEN_Symbol => True, others => False);
Becomes_Comma_IDent_Semicolon : constant Symset :=
(Semicolon | Comma | IDent | Becomes => True, others => False);
Becomes_EQL_Semicolon : constant Symset :=
(Becomes | EQL | Semicolon => True, others => False);
Becomes_EQL : constant Symset :=
(Becomes | EQL => True, others => False);
Colon_Comma_LParent_RParent_Semicolon : constant Symset :=
(Colon | Comma | LParent | RParent | Semicolon => True, others => False);
Colon_Comma_RParent : constant Symset :=
(Colon | Comma | RParent => True, others => False);
Colon_Comma_IS_OF : constant Symset :=
(Colon | Comma | IS_Symbol | OF_Symbol => True, others => False);
Comma_END_IDent_Semicolon : constant Symset :=
(Comma | END_Symbol | IDent | Semicolon => True, others => False);
Comma_IDent_Semicolon : constant Symset :=
(Comma | IDent | Semicolon => True, others => False);
Comma_IDent_RParent_Semicolon : constant Symset :=
(Comma | IDent | RParent | Semicolon => True, others => False);
Comma_OF_RParent : constant Symset :=
(Comma | RParent | OF_Symbol => True, others => False);
Comma_RParent : constant Symset :=
(Comma | RParent => True, others => False);
DO_LOOP : constant Symset :=
(DO_Symbol | LOOP_Symbol => True, others => False);
DO_THEN : constant Symset :=
(DO_Symbol | THEN_Symbol => True, others => False);
ELSE_ELSIF_END : constant Symset :=
(ELSE_Symbol | ELSIF_Symbol | END_Symbol => True, others => False);
ELSE_END_OR : constant Symset :=
(ELSE_Symbol | END_Symbol | OR_Symbol => True, others => False);
ELSE_OR : constant Symset :=
(ELSE_Symbol | OR_Symbol => True, others => False);
END_IDent_Semicolon : constant Symset :=
(END_Symbol | IDent | Semicolon => True, others => False);
END_LOOP_RANGE_Double_Dot : constant Symset :=
(END_Symbol | LOOP_Symbol | Range_Double_Dot_Symbol => True, others => False);
END_LOOP_Semicolon : constant Symset :=
(END_Symbol | LOOP_Symbol | Semicolon => True, others => False);
END_WHEN : constant Symset :=
(END_Symbol | WHEN_Symbol => True, others => False);
OF_RANGE_Double_Dot_RParent : constant Symset :=
(OF_Symbol | Range_Double_Dot_Symbol | RParent => True, others => False);
-- Other sets, named by their context:
After_Subprogram_Parameters : constant Symset :=
(IS_Symbol | RETURN_Symbol | Semicolon => True, others => False);
Block_Begin_Symbol : constant Symset :=
(PROCEDURE_Symbol |
FUNCTION_Symbol |
TASK_Symbol |
ENTRY_Symbol |
BEGIN_Symbol |
DECLARE_Symbol => True,
others => False);
Constant_Definition_Begin_Symbol : constant Symset :=
(Plus |
Minus |
IntCon |
FloatCon |
CharCon |
IDent => True,
others => False);
Declaration_Symbol : constant Symset :=
(IDent |
SUBTYPE_Symbol |
TYPE_Symbol |
TASK_Symbol |
PROCEDURE_Symbol |
FUNCTION_Symbol => True,
others => False);
Factor_Begin_Symbol : constant Symset :=
(IntCon |
FloatCon |
CharCon |
IDent |
LParent |
NOT_Symbol => True,
others => False);
FactorZ : constant Symset :=
(Times | Divide | MOD_Symbol | REM_Symbol | AND_Symbol => True,
Power => True, -- !! The ** operator has a higher precedence level 4.4 (6)
others => False);
Fail_after_FOR : constant Symset :=
(IN_Symbol |
Range_Double_Dot_Symbol |
LOOP_Symbol |
END_Symbol => True,
others => False);
Comparison_Operator_Set : constant Symset :=
(Comparison_Operator => True, others => False);
Plus_Minus : constant Symset :=
(Plus | Minus => True, others => False);
Selector_Symbol : constant Symset :=
(LParent | Period => True, others => False);
Selector_Symbol_Loose : constant Symset :=
(LBrack | LParent | Period => True, others => False);
Statement_Begin_Symbol : constant Symset :=
(IDent |
BEGIN_Symbol |
DECLARE_Symbol |
IF_Symbol |
WHILE_Symbol |
LOOP_Symbol |
FOR_Symbol |
CASE_Symbol |
EXIT_Symbol |
NULL_Symbol |
RETURN_Symbol |
SELECT_Symbol |
ACCEPT_Symbol |
DELAY_Symbol => True,
others => False);
Symbols_after_Subprogram_Identifier : constant Symset :=
(LParent | RETURN_Symbol | IS_Symbol | Semicolon => True,
others => False);
Binary_Adding_Operators : constant Symset := -- RM 4.5 (4)
(Plus | Minus | Ampersand_Symbol => True,
OR_Symbol | XOR_Symbol => True, -- Wrong level !!
others => False);
Type_Begin_Symbol : constant Symset :=
(IDent |
ARRAY_Symbol |
RECORD_Symbol |
RANGE_Keyword_Symbol |
LParent => True,
others => False);
------------------
-- Types sets --
------------------
Numeric_Typ_Set : constant Typ_Set := (Numeric_Typ => True, others => False);
Bools_Set : constant Typ_Set := (Bools => True, others => False);
Chars_Set : constant Typ_Set := (Chars => True, others => False);
Ints_Set : constant Typ_Set := (Ints => True, others => False);
Floats_Set : constant Typ_Set := (Floats => True, others => False);
Arrays_Set : constant Typ_Set := (Arrays => True, others => False);
VStrings_Set : constant Typ_Set := (VStrings => True, others => False);
Times_Set : constant Typ_Set := (Times => True, others => False);
Durations_Set : constant Typ_Set := (Durations => True, others => False);
Str_Lit_Set : constant Typ_Set := (String_Literals => True, others => False);
Txt_Fil_Set : constant Typ_Set := (Text_Files => True, others => False);
PCode_Atomic_Typ : constant Typ_Set := Discrete_Typ or Numeric_Typ_Set or VStrings_Set;
VStrings_or_Chars_Set : constant Typ_Set := VStrings_Set or Chars_Set;
VStrings_or_Str_Lit_Set : constant Typ_Set := VStrings_Set or Str_Lit_Set;
Fixed_Str_or_Str_Lit_Set : constant Typ_Set := Arrays_Set or Str_Lit_Set;
-- ^ If Arrays, need to call Is_Char_Array to check it's a String.
Chars_or_Strings_Set : constant Typ_Set := Chars_Set or Fixed_Str_or_Str_Lit_Set;
Standard_Set : constant Typ_Set := (Standard_Typ => True, others => False);
Text_IO_Get_Item_Set : constant Typ_Set := (Standard_Set and not Bools_Set) or Arrays_Set;
-------------
-- Misc. --
-------------
-- Check if we have an "array of Character", for instance a String.
--
function Is_Char_Array (CD : Compiler_Data; T : Exact_Typ) return Boolean;
------------------------------------------------------------------
------------------------------------------------Locate_Identifier-
function Locate_Identifier (
CD : in out Compiler_Data;
Id : Alfa;
Level : HAC_Sys.PCode.Nesting_level;
No_Id_Fail : Boolean := True;
stop_on_error : Boolean := False) return Natural;
------------------------------------------------------------------
----------------------------------------------Enter_or_find_Float-
procedure Enter_or_find_Float (
CD : in out Compiler_Data;
X : HAC_Float;
RNum_Index : out Natural
);
end HAC_Sys.Parser.Helpers;
|
onox/sdlada | Ada | 5,752 | ads | --------------------------------------------------------------------------------------------------------------------
-- Copyright (c) 2013-2018 Luke A. Guest
--
-- This software is provided 'as-is', without any express or implied
-- warranty. In no event will the authors be held liable for any damages
-- arising from the use of this software.
--
-- Permission is granted to anyone to use this software for any purpose,
-- including commercial applications, and to alter it and redistribute it
-- freely, subject to the following restrictions:
--
-- 1. The origin of this software must not be misrepresented; you must not
-- claim that you wrote the original software. If you use this software
-- in a product, an acknowledgment in the product documentation would be
-- appreciated but is not required.
--
-- 2. Altered source versions must be plainly marked as such, and must not be
-- misrepresented as being the original software.
--
-- 3. This notice may not be removed or altered from any source
-- distribution.
--------------------------------------------------------------------------------------------------------------------
-- SDL.TTFs
--
-- Root package implementing the binding to SDL2_ttf.
--------------------------------------------------------------------------------------------------------------------
with Ada.Finalization;
with Ada.Strings.UTF_Encoding;
with Interfaces.C;
with SDL.Video.Palettes;
with SDL.Video.Surfaces;
package SDL.TTFs is
package UTF_Strings renames Ada.Strings.UTF_Encoding;
package C renames Interfaces.C;
TTF_Error : exception;
function Initialise return Boolean with
Inline_Always => True;
procedure Finalise with
Import => True,
Convention => C,
External_Name => "TTF_Quit";
-- Fonts.
type Point_Sizes is new C.int;
type Font_Faces is range 0 .. C.long'Last with
Size => C.long'Size,
Convention => C;
type Font_Styles is mod 2 ** 32 with
Convention => C;
Style_Normal : constant Font_Styles := 16#0000_0000#;
Style_Bold : constant Font_Styles := 16#0000_0001#;
Style_Italic : constant Font_Styles := 16#0000_0002#;
Style_Underline : constant Font_Styles := 16#0000_0004#;
Style_Strike_Through : constant Font_Styles := 16#0000_0008#;
type Font_Outlines is range 0 .. C.int'Last with
Size => C.int'Size,
Convention => C;
Outlines_Off : constant Font_Outlines := Font_Outlines'First;
type Font_Hints is (Normal, Light, Mono, None) with
Convention => C;
type Font_Measurements is range 0 .. C.int'Last with
Size => C.int'Size,
Convention => C;
type Fonts is new Ada.Finalization.Controlled with private;
Null_Font : constant Fonts;
overriding
procedure Finalize (Self : in out Fonts);
function Style (Self : in Fonts) return Font_Styles with
Inline => True;
procedure Set_Style (Self : in out Fonts; Now : in Font_Styles) with
Inline => True;
function Outline (Self : in Fonts) return Font_Outlines with
Inline => True;
procedure Set_Outline (Self : in out Fonts; Now : in Font_Outlines := Outlines_Off) with
Inline => True;
function Hinting (Self : in Fonts) return Font_Hints with
Inline => True;
procedure Set_Hinting (Self : in out Fonts; Now : in Font_Hints := Normal) with
Inline => True;
function Kerning (Self : in Fonts) return Boolean with
Inline => True;
procedure Set_Kerning (Self : in out Fonts; Now : in Boolean) with
Inline => True;
function Height (Self : in Fonts) return Font_Measurements with
Inline => True;
function Ascent (Self : in Fonts) return Font_Measurements with
Inline => True;
function Descent (Self : in Fonts) return Font_Measurements with
Inline => True;
function Line_Skip (Self : in Fonts) return Font_Measurements with
Inline => True;
function Faces (Self : in Fonts) return Font_Faces with
Inline => True;
function Is_Face_Fixed_Width (Self : in Fonts) return Boolean with
Inline => True;
function Face_Family_Name (Self : in Fonts) return String with
Inline => True;
function Face_Style_Name (Self : in Fonts) return String with
Inline => True;
function Size_Latin_1 (Self : in Fonts; Text : in String) return SDL.Sizes with
Inline => True;
function Size_UTF_8 (Self : in Fonts; Text : in UTF_Strings.UTF_8_String) return SDL.Sizes with
Inline => True;
function Render_Solid (Self : in Fonts;
Text : in String;
Colour : in SDL.Video.Palettes.Colour) return SDL.Video.Surfaces.Surface;
function Render_Shaded (Self : in Fonts;
Text : in String;
Colour : in SDL.Video.Palettes.Colour;
Background_Colour : in SDL.Video.Palettes.Colour) return SDL.Video.Surfaces.Surface;
function Render_Blended (Self : in Fonts;
Text : in String;
Colour : in SDL.Video.Palettes.Colour) return SDL.Video.Surfaces.Surface;
private
type Internal_Fonts is null record;
type Fonts_Pointer is access all Internal_Fonts with
Convention => C;
subtype Fonts_Ref is not null Fonts_Pointer;
type Fonts is new Ada.Finalization.Controlled with
record
Internal : Fonts_Pointer := null;
Source_Freed : Boolean := False; -- Whether the Makers.* subprogram has already closed the font.
end record;
Null_Font : constant Fonts := (Ada.Finalization.Controlled with others => <>);
end SDL.TTFs;
|
kjseefried/coreland-cgbc | Ada | 899 | adb | with Ada.Strings;
with CGBC.Bounded_Wide_Strings;
with Test;
procedure T_WBstr_Append_RB02 is
package BS renames CGBC.Bounded_Wide_Strings;
TC : Test.Context_t;
S1 : BS.Bounded_String (8);
S : constant Wide_String := " H";
begin
Test.Initialize
(Test_Context => TC,
Program => "t_wbstr_append_rb02",
Test_DB => "TEST_DB",
Test_Results => "TEST_RESULTS");
BS.Append (S1, "ABCDEFG");
-- As Append_R02 but with unusual bounds on New_Item.
pragma Assert (S (10 .. 10) = "H");
BS.Append
(Source => S1,
New_Item => S (10 .. 10),
Drop => Ada.Strings.Right);
Test.Check (TC, 1295, BS.Length (S1) = 8, "BS.Length (S1) = 8");
Test.Check (TC, 1296, BS.Maximum_Length (S1) = 8, "BS.Maximum_Length (S1) = 8");
Test.Check (TC, 1297, BS.To_String (S1) = "ABCDEFGH", "BS.To_String (S1) = ""ABCDEFGH""");
end T_WBstr_Append_RB02;
|
reznikmm/matreshka | Ada | 3,961 | ads | ------------------------------------------------------------------------------
-- --
-- Matreshka Project --
-- --
-- Open Document Toolkit --
-- --
-- Runtime Library Component --
-- --
------------------------------------------------------------------------------
-- --
-- Copyright © 2014, Vadim Godunko <[email protected]> --
-- All rights reserved. --
-- --
-- Redistribution and use in source and binary forms, with or without --
-- modification, are permitted provided that the following conditions --
-- are met: --
-- --
-- * Redistributions of source code must retain the above copyright --
-- notice, this list of conditions and the following disclaimer. --
-- --
-- * Redistributions in binary form must reproduce the above copyright --
-- notice, this list of conditions and the following disclaimer in the --
-- documentation and/or other materials provided with the distribution. --
-- --
-- * Neither the name of the Vadim Godunko, IE nor the names of its --
-- contributors may be used to endorse or promote products derived from --
-- this software without specific prior written permission. --
-- --
-- THIS SOFTWARE IS PROVIDED BY THE COPYRIGHT HOLDERS AND CONTRIBUTORS --
-- "AS IS" AND ANY EXPRESS OR IMPLIED WARRANTIES, INCLUDING, BUT NOT --
-- LIMITED TO, THE IMPLIED WARRANTIES OF MERCHANTABILITY AND FITNESS FOR --
-- A PARTICULAR PURPOSE ARE DISCLAIMED. IN NO EVENT SHALL THE COPYRIGHT --
-- HOLDER OR CONTRIBUTORS BE LIABLE FOR ANY DIRECT, INDIRECT, INCIDENTAL, --
-- SPECIAL, EXEMPLARY, OR CONSEQUENTIAL DAMAGES (INCLUDING, BUT NOT LIMITED --
-- TO, PROCUREMENT OF SUBSTITUTE GOODS OR SERVICES; LOSS OF USE, DATA, OR --
-- PROFITS; OR BUSINESS INTERRUPTION) HOWEVER CAUSED AND ON ANY THEORY OF --
-- LIABILITY, WHETHER IN CONTRACT, STRICT LIABILITY, OR TORT (INCLUDING --
-- NEGLIGENCE OR OTHERWISE) ARISING IN ANY WAY OUT OF THE USE OF THIS --
-- SOFTWARE, EVEN IF ADVISED OF THE POSSIBILITY OF SUCH DAMAGE. --
-- --
------------------------------------------------------------------------------
-- $Revision$ $Date$
------------------------------------------------------------------------------
with ODF.DOM.Draw_Start_Attributes;
package Matreshka.ODF_Draw.Start_Attributes is
type Draw_Start_Attribute_Node is
new Matreshka.ODF_Draw.Abstract_Draw_Attribute_Node
and ODF.DOM.Draw_Start_Attributes.ODF_Draw_Start_Attribute
with null record;
overriding function Create
(Parameters : not null access Matreshka.DOM_Attributes.Attribute_L2_Parameters)
return Draw_Start_Attribute_Node;
overriding function Get_Local_Name
(Self : not null access constant Draw_Start_Attribute_Node)
return League.Strings.Universal_String;
end Matreshka.ODF_Draw.Start_Attributes;
|
reznikmm/matreshka | Ada | 3,891 | ads | ------------------------------------------------------------------------------
-- --
-- Matreshka Project --
-- --
-- Open Document Toolkit --
-- --
-- Runtime Library Component --
-- --
------------------------------------------------------------------------------
-- --
-- Copyright © 2013, Vadim Godunko <[email protected]> --
-- All rights reserved. --
-- --
-- Redistribution and use in source and binary forms, with or without --
-- modification, are permitted provided that the following conditions --
-- are met: --
-- --
-- * Redistributions of source code must retain the above copyright --
-- notice, this list of conditions and the following disclaimer. --
-- --
-- * Redistributions in binary form must reproduce the above copyright --
-- notice, this list of conditions and the following disclaimer in the --
-- documentation and/or other materials provided with the distribution. --
-- --
-- * Neither the name of the Vadim Godunko, IE nor the names of its --
-- contributors may be used to endorse or promote products derived from --
-- this software without specific prior written permission. --
-- --
-- THIS SOFTWARE IS PROVIDED BY THE COPYRIGHT HOLDERS AND CONTRIBUTORS --
-- "AS IS" AND ANY EXPRESS OR IMPLIED WARRANTIES, INCLUDING, BUT NOT --
-- LIMITED TO, THE IMPLIED WARRANTIES OF MERCHANTABILITY AND FITNESS FOR --
-- A PARTICULAR PURPOSE ARE DISCLAIMED. IN NO EVENT SHALL THE COPYRIGHT --
-- HOLDER OR CONTRIBUTORS BE LIABLE FOR ANY DIRECT, INDIRECT, INCIDENTAL, --
-- SPECIAL, EXEMPLARY, OR CONSEQUENTIAL DAMAGES (INCLUDING, BUT NOT LIMITED --
-- TO, PROCUREMENT OF SUBSTITUTE GOODS OR SERVICES; LOSS OF USE, DATA, OR --
-- PROFITS; OR BUSINESS INTERRUPTION) HOWEVER CAUSED AND ON ANY THEORY OF --
-- LIABILITY, WHETHER IN CONTRACT, STRICT LIABILITY, OR TORT (INCLUDING --
-- NEGLIGENCE OR OTHERWISE) ARISING IN ANY WAY OUT OF THE USE OF THIS --
-- SOFTWARE, EVEN IF ADVISED OF THE POSSIBILITY OF SUCH DAMAGE. --
-- --
------------------------------------------------------------------------------
-- $Revision$ $Date$
------------------------------------------------------------------------------
with Matreshka.ODF_Elements.Style.Table_Properties;
package ODF.DOM.Elements.Style.Table_Properties.Internals is
function Create
(Node : Matreshka.ODF_Elements.Style.Table_Properties.Style_Table_Properties_Access)
return ODF.DOM.Elements.Style.Table_Properties.ODF_Style_Table_Properties;
function Wrap
(Node : Matreshka.ODF_Elements.Style.Table_Properties.Style_Table_Properties_Access)
return ODF.DOM.Elements.Style.Table_Properties.ODF_Style_Table_Properties;
end ODF.DOM.Elements.Style.Table_Properties.Internals;
|
sungyeon/drake | Ada | 418 | adb | with Ada.Streams; use Ada.Streams;
with Ada.Streams.Stream_IO; use Ada.Streams.Stream_IO;
with Ada.Streams.Stream_IO.Standard_Files; use Ada.Streams.Stream_IO.Standard_Files;
procedure streamcat is
E : Stream_Element_Array (1 .. 1);
Last : Stream_Element_Offset;
begin
while not End_Of_File (Standard_Input.all) loop
Read (Standard_Input.all, E, Last);
Write (Standard_Output.all, E);
end loop;
end streamcat;
|
zhmu/ananas | Ada | 5,038 | ads | ------------------------------------------------------------------------------
-- --
-- GNAT RUN-TIME LIBRARY (GNARL) COMPONENTS --
-- --
-- S Y S T E M . B I T _ O P S --
-- --
-- S p e c --
-- --
-- Copyright (C) 1992-2022, Free Software Foundation, Inc. --
-- --
-- GNAT is free software; you can redistribute it and/or modify it under --
-- terms of the GNU General Public License as published by the Free Soft- --
-- ware Foundation; either version 3, or (at your option) any later ver- --
-- sion. GNAT is distributed in the hope that it will be useful, but WITH- --
-- OUT ANY WARRANTY; without even the implied warranty of MERCHANTABILITY --
-- or FITNESS FOR A PARTICULAR PURPOSE. --
-- --
-- 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. --
-- --
------------------------------------------------------------------------------
-- Operations on packed bit strings
package System.Bit_Ops is
-- Note: in all the following routines, the System.Address parameters
-- represent the address of the first byte of an array used to represent
-- a packed array (of type System.Unsigned_Types.Packed_Bytes{1,2,4})
-- The length in bits is passed as a separate parameter. Note that all
-- addresses must be of byte aligned arrays.
procedure Bit_And
(Left : System.Address;
Llen : Natural;
Right : System.Address;
Rlen : Natural;
Result : System.Address);
-- Bitwise "and" of given bit string with result being placed in Result.
-- The and operation is allowed to destroy unused bits in the last byte,
-- i.e. to leave them set in an undefined manner. Note that Left, Right
-- and Result always have the same length in bits (Len).
function Bit_Eq
(Left : System.Address;
Llen : Natural;
Right : System.Address;
Rlen : Natural) return Boolean;
-- Left and Right are the addresses of two bit packed arrays with Llen
-- and Rlen being the respective length in bits. The routine compares the
-- two bit strings for equality, being careful not to include the unused
-- bits in the final byte. Note that the result is always False if Rlen
-- is not equal to Llen.
procedure Bit_Not
(Opnd : System.Address;
Len : Natural;
Result : System.Address);
-- Bitwise "not" of given bit string with result being placed in Result.
-- The not operation is allowed to destroy unused bits in the last byte,
-- i.e. to leave them set in an undefined manner. Note that Result and
-- Opnd always have the same length in bits (Len).
procedure Bit_Or
(Left : System.Address;
Llen : Natural;
Right : System.Address;
Rlen : Natural;
Result : System.Address);
-- Bitwise "or" of given bit string with result being placed in Result.
-- The or operation is allowed to destroy unused bits in the last byte,
-- i.e. to leave them set in an undefined manner. Note that Left, Right
-- and Result always have the same length in bits (Len).
procedure Bit_Xor
(Left : System.Address;
Llen : Natural;
Right : System.Address;
Rlen : Natural;
Result : System.Address);
-- Bitwise "xor" of given bit string with result being placed in Result.
-- The xor operation is allowed to destroy unused bits in the last byte,
-- i.e. to leave them set in an undefined manner. Note that Left, Right
-- and Result always have the same length in bits (Len).
end System.Bit_Ops;
|
reznikmm/clic | Ada | 941 | ads | package CLIC.Config.Edit is
function Unset (Path : String;
Key : Config_Key)
return Boolean;
-- Unset/Remove a key from a configuration file. Return True in case of
-- success or False when the configuration file or the key don't exist.
function Set (Path : String;
Key : Config_Key;
Value : String;
Check : Check_Import := null)
return Boolean;
-- Set a key in a configuration file. Return True in case of success or
-- False when the value is invalid or rejected by the Check function.
--
-- When a Check function is provided, it will be called on the
-- config key/value. If Check return False, Set returns False and the
-- configuration file is not modified. In addition the Check function
-- can print an error message explaining why the key/value is invalid.
end CLIC.Config.Edit;
|
gusthoff/ada_wavefiles_gtk_app | Ada | 1,561 | ads | -------------------------------------------------------------------------------
--
-- WAVEFILES GTK APPLICATION
--
-- Wavefile Manager
--
-- The MIT License (MIT)
--
-- Copyright (c) 2017 Gustavo A. Hoffmann
--
-- Permission is hereby granted, free of charge, to any person obtaining a copy
-- of this software and associated documentation files (the "Software"), to
-- deal in the Software without restriction, including without limitation the
-- rights to use, copy, modify, merge, publish, distribute, sublicense, and /
-- or sell copies of the Software, and to permit persons to whom the Software
-- is furnished to do so, subject to the following conditions:
--
-- The above copyright notice and this permission notice shall be included in
-- all copies or substantial portions of the Software.
--
-- THE SOFTWARE IS PROVIDED "AS IS", WITHOUT WARRANTY OF ANY KIND, EXPRESS OR
-- IMPLIED, INCLUDING BUT NOT LIMITED TO THE WARRANTIES OF MERCHANTABILITY,
-- FITNESS FOR A PARTICULAR PURPOSE AND NONINFRINGEMENT. IN NO EVENT SHALL THE
-- AUTHORS OR COPYRIGHT HOLDERS BE LIABLE FOR ANY CLAIM, DAMAGES OR OTHER
-- LIABILITY, WHETHER IN AN ACTION OF CONTRACT, TORT OR OTHERWISE, ARISING
-- FROM, OUT OF OR IN CONNECTION WITH THE SOFTWARE OR THE USE OR OTHER DEALINGS
-- IN THE SOFTWARE.
-------------------------------------------------------------------------------
private package WaveFiles_Gtk.Wavefile_Manager is
function Get_Info (Wavefile : String) return String;
end WaveFiles_Gtk.Wavefile_Manager;
|
AdaCore/gpr | Ada | 1,770 | adb | ------------------------------------------------------------------------------
-- --
-- GPR2 PROJECT MANAGER --
-- --
-- Copyright (C) 2019-2023, AdaCore --
-- --
-- This 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. This software is distributed in the hope that it will be useful, --
-- but WITHOUT ANY WARRANTY; without even the implied warranty of MERCHAN- --
-- TABILITY or FITNESS FOR A PARTICULAR PURPOSE. See the GNU General Public --
-- License for more details. You should have received a copy of the GNU --
-- General Public License distributed with GNAT; see file COPYING. If not, --
-- see <http://www.gnu.org/licenses/>. --
-- --
------------------------------------------------------------------------------
package body GPRname.Unit is
------------
-- Create --
------------
function Create
(Name : GPR2.Name_Type;
Kind : Unit_Kind;
Index_In_Source : Natural) return Object is
begin
return Object'(Name => +String (Name),
Kind => Kind,
Index_In_Source => Index_In_Source);
end Create;
end GPRname.Unit;
|
tum-ei-rcs/StratoX | Ada | 3,175 | adb |
with Interfaces; use Interfaces;
with PX4IO.Driver; use PX4IO;
with NVRAM;
with Types;
with Logger;
package body Servo with SPARK_Mode is
------------
-- Types
------------
type Servo_Setting_Type is record
left : Servo_Angle_Type := Servo_Angle_Type (0.0);
right : Servo_Angle_Type := Servo_Angle_Type (0.0);
end record;
-------------
-- States
-------------
Last_Critical : Servo_Setting_Type;
----------------
-- Initialize
----------------
procedure initialize is
nleft, nright : Integer_8;
function Sat_Cast_ServoAngle is new Units.Saturated_Cast (Servo_Angle_Type);
begin
-- load most recent critical angles
NVRAM.Load (NVRAM.VAR_SERVO_LEFT, nleft);
NVRAM.Load (NVRAM.VAR_SERVO_RIGHT, nright);
-- init and move servos to given angle
Last_Critical.left := Sat_Cast_ServoAngle (Float (Unit_Type (nleft) * Degree));
Last_Critical.right := Sat_Cast_ServoAngle (Float (Unit_Type (nright) * Degree));
Logger.log_console (Logger.DEBUG, "Servo restore: " &
AImage (Last_Critical.left) & " / " &
AImage (Last_Critical.right));
Driver.initialize (init_left => Last_Critical.left, init_right => Last_Critical.right);
end initialize;
------------------------
-- Set_Angle
------------------------
procedure Set_Angle (which : Servo_Type; angle : Servo_Angle_Type) is
begin
case which is
when LEFT_ELEVON =>
Driver.Set_Servo_Angle (Driver.LEFT_ELEVON, angle);
when RIGHT_ELEVON =>
Driver.Set_Servo_Angle (Driver.RIGHT_ELEVON, angle);
end case;
end Set_Angle;
------------------------
-- Set_Critical_Angle
------------------------
procedure Set_Critical_Angle (which : Servo_Type; angle : Servo_Angle_Type) is
begin
Set_Angle (which, angle);
-- backup to NVRAM, if it has changed
case which is
when LEFT_ELEVON =>
if angle /= Last_Critical.left then
declare
pos : constant Integer_8 := Types.Sat_Cast_Int8 (To_Degree (angle));
begin
NVRAM.Store (NVRAM.VAR_SERVO_LEFT, pos);
Last_Critical.left := angle;
end;
end if;
when RIGHT_ELEVON =>
if angle /= Last_Critical.right then
declare
pos : constant Integer_8 := Types.Sat_Cast_Int8 (To_Degree (angle));
begin
NVRAM.Store (NVRAM.VAR_SERVO_RIGHT, pos);
Last_Critical.right := angle;
end;
end if;
end case;
end Set_Critical_Angle;
--------------
-- activate
--------------
procedure activate is
begin
-- arm PX4IO
Driver.arm;
end activate;
----------------
-- deactivate
----------------
procedure deactivate is
begin
-- arm PX4IO
Driver.disarm;
end deactivate;
-----------
-- sync
-----------
procedure sync is
begin
Driver.sync_Outputs;
end sync;
end Servo;
|
ytomino/web-ada | Ada | 2,548 | adb | with Ada.Calendar;
with Ada.Directories;
package body Web.Lock_Files is
use type Ada.Calendar.Time;
function Lock (
Name : String;
Force : Duration := 0.0;
Timeout : Duration := 3.0;
Retry_Interval : Duration := 1.0;
Forced : access Boolean := null)
return Boolean
is
Gone : Duration := 0.0;
begin
if Forced /= null then
Forced.all := False;
end if;
loop
if Force /= 0.0 then
declare
Now : constant Ada.Calendar.Time := Ada.Calendar.Clock;
begin
if Now - Ada.Directories.Modification_Time (Name) >= Force then
Ada.Directories.Delete_Directory (Name);
if Forced /= null then
Forced.all := True;
end if;
end if;
exception
when Name_Error | Use_Error => null;
end;
end if;
begin
Ada.Directories.Create_Directory (Name);
return True;
exception
when Use_Error => null;
end;
declare
Interval : constant Duration := Duration'Min (Retry_Interval, Timeout - Gone);
begin
if Interval <= 0.0 then
return False;
end if;
delay Interval;
Gone := Gone + Interval;
end;
end loop;
end Lock;
procedure Lock (
Name : in String;
Force : in Duration := 0.0;
Timeout : in Duration := 3.0;
Retry_Interval : in Duration := 1.0;
Forced : access Boolean := null) is
begin
if not Lock (
Name,
Force => Force,
Timeout => Timeout,
Retry_Interval => Retry_Interval,
Forced => Forced)
then
raise Lock_Error;
end if;
end Lock;
procedure Unlock (Name : in String)
renames Ada.Directories.Delete_Directory;
function Lock (
Name : String;
Force : Duration := 0.0;
Timeout : Duration := 3.0;
Retry_Interval : Duration := 1.0)
return Lock_Type is
begin
return Result : Lock_Type :=
(Ada.Finalization.Limited_Controlled
with
Name_Length => Name'Length,
Locked => False,
Forced => False,
Name => Name)
do
Lock (
Name,
Force => Force,
Timeout => Timeout,
Retry_Interval => Retry_Interval,
Forced => Result.Forced'Access);
Result.Locked := True;
end return;
end Lock;
function Forced (Object : Lock_Type) return Boolean is
begin
return Object.Forced;
end Forced;
procedure Unlock (Object : in out Lock_Type) is
begin
if Object.Locked then
Unlock (Object.Name);
end if;
end Unlock;
overriding procedure Finalize (Object : in out Lock_Type) is
begin
Unlock (Object);
exception
when Name_Error | Use_Error => null; -- Finalize can not raise any exception
end Finalize;
end Web.Lock_Files;
|
emacsmirror/ada-mode | Ada | 192,460 | ads | -- generated parser support file. -*- buffer-read-only:t -*-
-- command line: wisitoken-bnf-generate.exe --generate LR1 Ada_Emacs re2c PROCESS text_rep ada_annex_p.wy
--
-- Copyright (C) 2013 - 2022 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, or (at
-- your option) any later version.
--
-- This software is distributed in the hope that it will be useful,
-- but WITHOUT ANY WARRANTY; without even the implied warranty of
-- MERCHANTABILITY or FITNESS FOR A PARTICULAR PURPOSE. See the GNU
-- General Public License for more details.
--
-- You should have received a copy of the GNU General Public License
-- along with GNU Emacs. If not, see <https://www.gnu.org/licenses/>.
with WisiToken.Syntax_Trees;
package Ada_Annex_P_Process_Actions is
Descriptor : aliased constant WisiToken.Descriptor :=
(First_Terminal => 11,
Last_Terminal => 119,
First_Nonterminal => 120,
Last_Nonterminal => 466,
SOI_ID => 467,
EOI_ID => 119,
Accept_ID => 120,
Case_Insensitive => True,
New_Line_ID => 1,
String_1_ID => 118,
String_2_ID => 117,
Image =>
(new String'("WHITESPACE"),
new String'("NEW_LINE"),
new String'("COMMENT"),
new String'("GNAT_PREP_IF"),
new String'("GNAT_PREP_ELSIF"),
new String'("GNAT_PREP_ELSE"),
new String'("GNAT_PREP_END_IF"),
new String'("CONFLICT_MARK_A"),
new String'("CONFLICT_MARK_B"),
new String'("CONFLICT_MARK_END"),
new String'("PLACEHOLDER"),
new String'("AT"),
new String'("RAISE"),
new String'("SEPARATE"),
new String'("TERMINATE"),
new String'("SELECT"),
new String'("UNTIL"),
new String'("DELAY"),
new String'("ABORT"),
new String'("REQUEUE"),
new String'("ACCEPT"),
new String'("ENTRY"),
new String'("GENERIC"),
new String'("EXCEPTION"),
new String'("RENAMES"),
new String'("OVERRIDING"),
new String'("BODY"),
new String'("PRIVATE"),
new String'("PACKAGE"),
new String'("OUT"),
new String'("RETURN"),
new String'("GOTO"),
new String'("EXIT"),
new String'("DO"),
new String'("REVERSE"),
new String'("WHILE"),
new String'("LOOP"),
new String'("PARALLEL"),
new String'("BEGIN"),
new String'("DECLARE"),
new String'("SOME"),
new String'("IF"),
new String'("ELSIF"),
new String'("REM"),
new String'("ABS"),
new String'("IN"),
new String'("XOR"),
new String'("ELSE"),
new String'("OR"),
new String'("THEN"),
new String'("USE"),
new String'("FOR"),
new String'("NOT"),
new String'("FUNCTION"),
new String'("PROCEDURE"),
new String'("ALL"),
new String'("ACCESS"),
new String'("INTERFACE"),
new String'("SYNCHRONIZED"),
new String'("PROTECTED"),
new String'("TASK"),
new String'("WITH"),
new String'("OTHERS"),
new String'("WHEN"),
new String'("CASE"),
new String'("NULL"),
new String'("END"),
new String'("RECORD"),
new String'("TAGGED"),
new String'("OF"),
new String'("ARRAY"),
new String'("DELTA"),
new String'("DIGITS"),
new String'("MOD"),
new String'("RANGE"),
new String'("AND"),
new String'("NEW"),
new String'("LIMITED"),
new String'("ABSTRACT"),
new String'("CONSTANT"),
new String'("ALIASED"),
new String'("SUBTYPE"),
new String'("IS"),
new String'("TYPE"),
new String'("PRAGMA"),
new String'("LEFT_PAREN"),
new String'("LEFT_SQUARE_BRACKET"),
new String'("RIGHT_PAREN"),
new String'("RIGHT_SQUARE_BRACKET"),
new String'("AMPERSAND"),
new String'("AT_SIGN"),
new String'("BAR"),
new String'("BOX"),
new String'("COLON"),
new String'("COLON_EQUAL"),
new String'("COMMA"),
new String'("DOT"),
new String'("DOT_DOT"),
new String'("EQUAL"),
new String'("EQUAL_GREATER"),
new String'("GREATER"),
new String'("GREATER_EQUAL"),
new String'("GREATER_GREATER"),
new String'("LESS"),
new String'("LESS_EQUAL"),
new String'("LESS_LESS"),
new String'("MINUS"),
new String'("PLUS"),
new String'("SEMICOLON"),
new String'("SLASH"),
new String'("SLASH_EQUAL"),
new String'("STAR"),
new String'("STAR_STAR"),
new String'("TICK_1"),
new String'("TICK_2"),
new String'("NUMERIC_LITERAL"),
new String'("IDENTIFIER"),
new String'("STRING_LITERAL"),
new String'("CHARACTER_LITERAL"),
new String'("Wisi_EOI"),
new String'("wisitoken_accept"),
new String'("tick"),
new String'("conditional_quantified_expression"),
new String'("pragma_argument_association_list"),
new String'("pragma_g"),
new String'("pragma_argument_association"),
new String'("basic_declaration"),
new String'("type_declaration"),
new String'("full_type_declaration"),
new String'("type_definition"),
new String'("subtype_declaration"),
new String'("subtype_indication"),
new String'("constraint"),
new String'("scalar_constraint"),
new String'("assign_value"),
new String'("object_declaration"),
new String'("defining_identifier_list"),
new String'("number_declaration"),
new String'("derived_type_definition"),
new String'("range_constraint"),
new String'("range_g"),
new String'("enumeration_literal_list"),
new String'("enumeration_type_definition"),
new String'("enumeration_literal_specification"),
new String'("integer_type_definition"),
new String'("signed_integer_type_definition"),
new String'("modular_type_definition"),
new String'("real_type_definition"),
new String'("floating_point_definition"),
new String'("real_range_specification"),
new String'("fixed_point_definition"),
new String'("ordinary_fixed_point_definition"),
new String'("decimal_fixed_point_definition"),
new String'("digits_constraint"),
new String'("array_type_definition"),
new String'("index_subtype_definition_list"),
new String'("unconstrained_array_definition"),
new String'("index_subtype_definition"),
new String'("discrete_subtype_definition_list"),
new String'("constrained_array_definition"),
new String'("discrete_subtype_definition"),
new String'("component_definition"),
new String'("index_constraint"),
new String'("discrete_range"),
new String'("discriminant_part"),
new String'("unknown_discriminant_part"),
new String'("discriminant_specification_list"),
new String'("known_discriminant_part"),
new String'("discriminant_specification"),
new String'("record_type_definition"),
new String'("record_definition"),
new String'("component_list"),
new String'("component_item"),
new String'("component_declaration"),
new String'("variant_list"),
new String'("variant_part"),
new String'("variant"),
new String'("discrete_choice_list"),
new String'("discrete_choice"),
new String'("record_extension_part"),
new String'("abstract_subprogram_declaration"),
new String'("interface_type_definition"),
new String'("interface_list"),
new String'("access_type_definition"),
new String'("access_to_object_definition"),
new String'("general_access_modifier"),
new String'("access_to_subprogram_definition"),
new String'("null_exclusion"),
new String'("access_definition"),
new String'("incomplete_type_declaration"),
new String'("declarative_item"),
new String'("declarative_item_pragma"),
new String'("declarative_part"),
new String'("basic_declarative_item"),
new String'("proper_body"),
new String'("name"),
new String'("direct_name"),
new String'("explicit_dereference"),
new String'("slice"),
new String'("selected_component"),
new String'("selector_name"),
new String'("attribute_reference"),
new String'("attribute_designator"),
new String'("range_attribute_reference"),
new String'("range_attribute_designator"),
new String'("aggregate"),
new String'("record_aggregate"),
new String'("record_component_association_list"),
new String'("record_component_association"),
new String'("component_choice_list"),
new String'("extension_aggregate"),
new String'("array_aggregate"),
new String'("expression_list"),
new String'("positional_array_aggregate"),
new String'("null_array_aggregate"),
new String'("named_array_aggregate"),
new String'("array_component_association_list"),
new String'("array_component_association"),
new String'("delta_aggregate"),
new String'("record_delta_aggregate"),
new String'("array_delta_aggregate"),
new String'("iterated_element_association"),
new String'("AND_relation_list"),
new String'("AND_THEN_relation_list"),
new String'("OR_relation_list"),
new String'("OR_ELSE_relation_list"),
new String'("XOR_relation_list"),
new String'("expression"),
new String'("relation"),
new String'("membership_choice_list"),
new String'("membership_choice"),
new String'("simple_expression"),
new String'("term"),
new String'("factor"),
new String'("primary"),
new String'("relational_operator"),
new String'("binary_adding_operator"),
new String'("unary_adding_operator"),
new String'("multiplying_operator"),
new String'("conditional_expression"),
new String'("elsif_expression_item"),
new String'("elsif_expression_list"),
new String'("if_expression"),
new String'("condition"),
new String'("case_expression_alternative_list"),
new String'("case_expression"),
new String'("case_expression_alternative"),
new String'("quantified_expression"),
new String'("quantifier"),
new String'("declare_expression"),
new String'("declare_item"),
new String'("reduction_attribute_reference"),
new String'("value_sequence"),
new String'("reduction_attribute_designator"),
new String'("reduction_specification"),
new String'("qualified_expression"),
new String'("allocator"),
new String'("subtype_indication_paren_constraint"),
new String'("subpool_specification"),
new String'("sequence_of_statements"),
new String'("sequence_of_statements_opt"),
new String'("statement"),
new String'("simple_statement"),
new String'("compound_statement"),
new String'("null_statement"),
new String'("label"),
new String'("statement_identifier"),
new String'("assignment_statement"),
new String'("target_name"),
new String'("elsif_statement_item"),
new String'("elsif_statement_list"),
new String'("if_statement"),
new String'("case_statement_alternative_list"),
new String'("case_statement"),
new String'("case_statement_alternative"),
new String'("loop_statement"),
new String'("iteration_scheme"),
new String'("chunk_specification"),
new String'("loop_parameter_specification"),
new String'("iterator_filter"),
new String'("iterator_specification"),
new String'("loop_parameter_subtype_indication"),
new String'("procedural_iterator"),
new String'("iterator_parameter_specification"),
new String'("identifier_opt"),
new String'("label_opt"),
new String'("block_statement"),
new String'("statement_AND_list"),
new String'("parallel_block_statement"),
new String'("exit_statement"),
new String'("goto_statement"),
new String'("subprogram_declaration"),
new String'("subprogram_specification"),
new String'("procedure_specification"),
new String'("function_specification"),
new String'("parameter_profile"),
new String'("result_profile"),
new String'("parameter_and_result_profile"),
new String'("parameter_specification_list"),
new String'("formal_part"),
new String'("parameter_specification"),
new String'("mode"),
new String'("global_aspect_definition"),
new String'("global_aspect_element"),
new String'("global_mode"),
new String'("basic_global_mode"),
new String'("global_set"),
new String'("global_designator"),
new String'("name_opt"),
new String'("subprogram_body"),
new String'("procedure_call_statement"),
new String'("function_call"),
new String'("parameter_association_list"),
new String'("actual_parameter_part"),
new String'("assoc_expression"),
new String'("parameter_association"),
new String'("simple_return_statement"),
new String'("extended_return_object_declaration"),
new String'("extended_return_statement"),
new String'("return_subtype_indication"),
new String'("null_procedure_declaration"),
new String'("expression_function_declaration"),
new String'("package_declaration"),
new String'("basic_declarative_item_pragma"),
new String'("basic_declarative_item_list"),
new String'("package_specification"),
new String'("package_body"),
new String'("private_type_declaration"),
new String'("private_extension_declaration"),
new String'("overriding_indicator"),
new String'("use_clause"),
new String'("name_list"),
new String'("use_package_clause"),
new String'("use_type_clause"),
new String'("renaming_declaration"),
new String'("object_renaming_declaration"),
new String'("exception_renaming_declaration"),
new String'("package_renaming_declaration"),
new String'("subprogram_renaming_declaration"),
new String'("generic_renaming_declaration"),
new String'("task_type_declaration"),
new String'("single_task_declaration"),
new String'("task_item_list"),
new String'("task_definition"),
new String'("task_item"),
new String'("task_body"),
new String'("protected_type_declaration"),
new String'("single_protected_declaration"),
new String'("protected_operation_declaration_list"),
new String'("protected_element_declaration_list"),
new String'("protected_definition"),
new String'("protected_operation_declaration"),
new String'("protected_element_declaration"),
new String'("protected_operation_item_list"),
new String'("protected_body"),
new String'("protected_operation_item"),
new String'("entry_declaration"),
new String'("accept_statement"),
new String'("entry_index"),
new String'("entry_body"),
new String'("entry_body_formal_part"),
new String'("entry_barrier"),
new String'("entry_index_specification"),
new String'("requeue_statement"),
new String'("delay_statement"),
new String'("delay_until_statement"),
new String'("delay_relative_statement"),
new String'("select_statement"),
new String'("guard_select"),
new String'("select_alternative_list"),
new String'("selective_accept"),
new String'("guard"),
new String'("select_alternative"),
new String'("accept_alternative"),
new String'("delay_alternative"),
new String'("terminate_alternative"),
new String'("timed_entry_call"),
new String'("entry_call_alternative"),
new String'("conditional_entry_call"),
new String'("asynchronous_select"),
new String'("triggering_alternative"),
new String'("abortable_part"),
new String'("abort_statement"),
new String'("compilation"),
new String'("compilation_unit"),
new String'("with_clause"),
new String'("limited_with_clause"),
new String'("nonlimited_with_clause"),
new String'("body_stub"),
new String'("subprogram_body_stub"),
new String'("package_body_stub"),
new String'("task_body_stub"),
new String'("protected_body_stub"),
new String'("subunit"),
new String'("exception_declaration"),
new String'("exception_handler_list"),
new String'("handled_sequence_of_statements"),
new String'("exception_choice_list"),
new String'("exception_handler"),
new String'("choice_parameter_specification"),
new String'("exception_choice"),
new String'("raise_statement"),
new String'("raise_expression"),
new String'("generic_declaration"),
new String'("generic_subprogram_declaration"),
new String'("generic_package_declaration"),
new String'("generic_formal_part"),
new String'("generic_formal_parameter_declaration"),
new String'("generic_instantiation"),
new String'("formal_object_declaration"),
new String'("formal_type_declaration"),
new String'("formal_complete_type_declaration"),
new String'("formal_incomplete_type_declaration"),
new String'("formal_type_definition"),
new String'("formal_private_type_definition"),
new String'("formal_derived_type_definition"),
new String'("formal_discrete_type_definition"),
new String'("formal_signed_integer_type_definition"),
new String'("formal_modular_type_definition"),
new String'("formal_floating_point_definition"),
new String'("formal_ordinary_fixed_point_definition"),
new String'("formal_decimal_fixed_point_definition"),
new String'("formal_array_type_definition"),
new String'("formal_access_type_definition"),
new String'("formal_interface_type_definition"),
new String'("formal_subprogram_declaration"),
new String'("formal_concrete_subprogram_declaration"),
new String'("formal_abstract_subprogram_declaration"),
new String'("subprogram_default"),
new String'("default_name"),
new String'("formal_package_declaration"),
new String'("aspect_clause"),
new String'("aspect_association"),
new String'("aspect_mark_list"),
new String'("aspect_specification"),
new String'("aspect_mark"),
new String'("aspect_definition"),
new String'("attribute_definition_clause"),
new String'("enumeration_representation_clause"),
new String'("enumeration_aggregate"),
new String'("record_representation_clause"),
new String'("component_clause"),
new String'("position"),
new String'("first_bit"),
new String'("last_bit"),
new String'("extended_global_aspect_definition"),
new String'("extended_global_aspect_element"),
new String'("extended_global_mode"),
new String'("formal_parameter_designator"),
new String'("formal_parameter_set"),
new String'("formal_group_designator"),
new String'("dispatching_operation_set"),
new String'("dispatching_operation_specifier"),
new String'("delta_constraint"),
new String'("at_clause"),
new String'("mod_clause"),
new String'("discrete_range_COMMA_list"),
new String'("component_item_component_item_list"),
new String'("declarative_item_pragma_list"),
new String'("record_component_association_COMMA_list"),
new String'("declare_item_list"),
new String'("statement_statement_list"),
new String'("label_list"),
new String'("global_aspect_element_COMMA_list"),
new String'("generic_formal_parameter_declaration_list"),
new String'("term_binary_adding_operator_list"),
new String'("component_clause_list"),
new String'("Wisi_SOI")),
Terminal_Image_Width => 20,
Image_Width => 41,
Last_Lookahead => 119);
type Token_Enum_ID is
(WHITESPACE_ID,
NEW_LINE_ID,
COMMENT_ID,
GNAT_PREP_IF_ID,
GNAT_PREP_ELSIF_ID,
GNAT_PREP_ELSE_ID,
GNAT_PREP_END_IF_ID,
CONFLICT_MARK_A_ID,
CONFLICT_MARK_B_ID,
CONFLICT_MARK_END_ID,
PLACEHOLDER_ID,
AT_ID,
RAISE_ID,
SEPARATE_ID,
TERMINATE_ID,
SELECT_ID,
UNTIL_ID,
DELAY_ID,
ABORT_ID,
REQUEUE_ID,
ACCEPT_ID,
ENTRY_ID,
GENERIC_ID,
EXCEPTION_ID,
RENAMES_ID,
OVERRIDING_ID,
BODY_ID,
PRIVATE_ID,
PACKAGE_ID,
OUT_ID,
RETURN_ID,
GOTO_ID,
EXIT_ID,
DO_ID,
REVERSE_ID,
WHILE_ID,
LOOP_ID,
PARALLEL_ID,
BEGIN_ID,
DECLARE_ID,
SOME_ID,
IF_ID,
ELSIF_ID,
REM_ID,
ABS_ID,
IN_ID,
XOR_ID,
ELSE_ID,
OR_ID,
THEN_ID,
USE_ID,
FOR_ID,
NOT_ID,
FUNCTION_ID,
PROCEDURE_ID,
ALL_ID,
ACCESS_ID,
INTERFACE_ID,
SYNCHRONIZED_ID,
PROTECTED_ID,
TASK_ID,
WITH_ID,
OTHERS_ID,
WHEN_ID,
CASE_ID,
NULL_ID,
END_ID,
RECORD_ID,
TAGGED_ID,
OF_ID,
ARRAY_ID,
DELTA_ID,
DIGITS_ID,
MOD_ID,
RANGE_ID,
AND_ID,
NEW_ID,
LIMITED_ID,
ABSTRACT_ID,
CONSTANT_ID,
ALIASED_ID,
SUBTYPE_ID,
IS_ID,
TYPE_ID,
PRAGMA_ID,
LEFT_PAREN_ID,
LEFT_SQUARE_BRACKET_ID,
RIGHT_PAREN_ID,
RIGHT_SQUARE_BRACKET_ID,
AMPERSAND_ID,
AT_SIGN_ID,
BAR_ID,
BOX_ID,
COLON_ID,
COLON_EQUAL_ID,
COMMA_ID,
DOT_ID,
DOT_DOT_ID,
EQUAL_ID,
EQUAL_GREATER_ID,
GREATER_ID,
GREATER_EQUAL_ID,
GREATER_GREATER_ID,
LESS_ID,
LESS_EQUAL_ID,
LESS_LESS_ID,
MINUS_ID,
PLUS_ID,
SEMICOLON_ID,
SLASH_ID,
SLASH_EQUAL_ID,
STAR_ID,
STAR_STAR_ID,
TICK_1_ID,
TICK_2_ID,
NUMERIC_LITERAL_ID,
IDENTIFIER_ID,
STRING_LITERAL_ID,
CHARACTER_LITERAL_ID,
Wisi_EOI_ID,
wisitoken_accept_ID,
tick_ID,
conditional_quantified_expression_ID,
pragma_argument_association_list_ID,
pragma_g_ID,
pragma_argument_association_ID,
basic_declaration_ID,
type_declaration_ID,
full_type_declaration_ID,
type_definition_ID,
subtype_declaration_ID,
subtype_indication_ID,
constraint_ID,
scalar_constraint_ID,
assign_value_ID,
object_declaration_ID,
defining_identifier_list_ID,
number_declaration_ID,
derived_type_definition_ID,
range_constraint_ID,
range_g_ID,
enumeration_literal_list_ID,
enumeration_type_definition_ID,
enumeration_literal_specification_ID,
integer_type_definition_ID,
signed_integer_type_definition_ID,
modular_type_definition_ID,
real_type_definition_ID,
floating_point_definition_ID,
real_range_specification_ID,
fixed_point_definition_ID,
ordinary_fixed_point_definition_ID,
decimal_fixed_point_definition_ID,
digits_constraint_ID,
array_type_definition_ID,
index_subtype_definition_list_ID,
unconstrained_array_definition_ID,
index_subtype_definition_ID,
discrete_subtype_definition_list_ID,
constrained_array_definition_ID,
discrete_subtype_definition_ID,
component_definition_ID,
index_constraint_ID,
discrete_range_ID,
discriminant_part_ID,
unknown_discriminant_part_ID,
discriminant_specification_list_ID,
known_discriminant_part_ID,
discriminant_specification_ID,
record_type_definition_ID,
record_definition_ID,
component_list_ID,
component_item_ID,
component_declaration_ID,
variant_list_ID,
variant_part_ID,
variant_ID,
discrete_choice_list_ID,
discrete_choice_ID,
record_extension_part_ID,
abstract_subprogram_declaration_ID,
interface_type_definition_ID,
interface_list_ID,
access_type_definition_ID,
access_to_object_definition_ID,
general_access_modifier_ID,
access_to_subprogram_definition_ID,
null_exclusion_ID,
access_definition_ID,
incomplete_type_declaration_ID,
declarative_item_ID,
declarative_item_pragma_ID,
declarative_part_ID,
basic_declarative_item_ID,
proper_body_ID,
name_ID,
direct_name_ID,
explicit_dereference_ID,
slice_ID,
selected_component_ID,
selector_name_ID,
attribute_reference_ID,
attribute_designator_ID,
range_attribute_reference_ID,
range_attribute_designator_ID,
aggregate_ID,
record_aggregate_ID,
record_component_association_list_ID,
record_component_association_ID,
component_choice_list_ID,
extension_aggregate_ID,
array_aggregate_ID,
expression_list_ID,
positional_array_aggregate_ID,
null_array_aggregate_ID,
named_array_aggregate_ID,
array_component_association_list_ID,
array_component_association_ID,
delta_aggregate_ID,
record_delta_aggregate_ID,
array_delta_aggregate_ID,
iterated_element_association_ID,
AND_relation_list_ID,
AND_THEN_relation_list_ID,
OR_relation_list_ID,
OR_ELSE_relation_list_ID,
XOR_relation_list_ID,
expression_ID,
relation_ID,
membership_choice_list_ID,
membership_choice_ID,
simple_expression_ID,
term_ID,
factor_ID,
primary_ID,
relational_operator_ID,
binary_adding_operator_ID,
unary_adding_operator_ID,
multiplying_operator_ID,
conditional_expression_ID,
elsif_expression_item_ID,
elsif_expression_list_ID,
if_expression_ID,
condition_ID,
case_expression_alternative_list_ID,
case_expression_ID,
case_expression_alternative_ID,
quantified_expression_ID,
quantifier_ID,
declare_expression_ID,
declare_item_ID,
reduction_attribute_reference_ID,
value_sequence_ID,
reduction_attribute_designator_ID,
reduction_specification_ID,
qualified_expression_ID,
allocator_ID,
subtype_indication_paren_constraint_ID,
subpool_specification_ID,
sequence_of_statements_ID,
sequence_of_statements_opt_ID,
statement_ID,
simple_statement_ID,
compound_statement_ID,
null_statement_ID,
label_ID,
statement_identifier_ID,
assignment_statement_ID,
target_name_ID,
elsif_statement_item_ID,
elsif_statement_list_ID,
if_statement_ID,
case_statement_alternative_list_ID,
case_statement_ID,
case_statement_alternative_ID,
loop_statement_ID,
iteration_scheme_ID,
chunk_specification_ID,
loop_parameter_specification_ID,
iterator_filter_ID,
iterator_specification_ID,
loop_parameter_subtype_indication_ID,
procedural_iterator_ID,
iterator_parameter_specification_ID,
identifier_opt_ID,
label_opt_ID,
block_statement_ID,
statement_AND_list_ID,
parallel_block_statement_ID,
exit_statement_ID,
goto_statement_ID,
subprogram_declaration_ID,
subprogram_specification_ID,
procedure_specification_ID,
function_specification_ID,
parameter_profile_ID,
result_profile_ID,
parameter_and_result_profile_ID,
parameter_specification_list_ID,
formal_part_ID,
parameter_specification_ID,
mode_ID,
global_aspect_definition_ID,
global_aspect_element_ID,
global_mode_ID,
basic_global_mode_ID,
global_set_ID,
global_designator_ID,
name_opt_ID,
subprogram_body_ID,
procedure_call_statement_ID,
function_call_ID,
parameter_association_list_ID,
actual_parameter_part_ID,
assoc_expression_ID,
parameter_association_ID,
simple_return_statement_ID,
extended_return_object_declaration_ID,
extended_return_statement_ID,
return_subtype_indication_ID,
null_procedure_declaration_ID,
expression_function_declaration_ID,
package_declaration_ID,
basic_declarative_item_pragma_ID,
basic_declarative_item_list_ID,
package_specification_ID,
package_body_ID,
private_type_declaration_ID,
private_extension_declaration_ID,
overriding_indicator_ID,
use_clause_ID,
name_list_ID,
use_package_clause_ID,
use_type_clause_ID,
renaming_declaration_ID,
object_renaming_declaration_ID,
exception_renaming_declaration_ID,
package_renaming_declaration_ID,
subprogram_renaming_declaration_ID,
generic_renaming_declaration_ID,
task_type_declaration_ID,
single_task_declaration_ID,
task_item_list_ID,
task_definition_ID,
task_item_ID,
task_body_ID,
protected_type_declaration_ID,
single_protected_declaration_ID,
protected_operation_declaration_list_ID,
protected_element_declaration_list_ID,
protected_definition_ID,
protected_operation_declaration_ID,
protected_element_declaration_ID,
protected_operation_item_list_ID,
protected_body_ID,
protected_operation_item_ID,
entry_declaration_ID,
accept_statement_ID,
entry_index_ID,
entry_body_ID,
entry_body_formal_part_ID,
entry_barrier_ID,
entry_index_specification_ID,
requeue_statement_ID,
delay_statement_ID,
delay_until_statement_ID,
delay_relative_statement_ID,
select_statement_ID,
guard_select_ID,
select_alternative_list_ID,
selective_accept_ID,
guard_ID,
select_alternative_ID,
accept_alternative_ID,
delay_alternative_ID,
terminate_alternative_ID,
timed_entry_call_ID,
entry_call_alternative_ID,
conditional_entry_call_ID,
asynchronous_select_ID,
triggering_alternative_ID,
abortable_part_ID,
abort_statement_ID,
compilation_ID,
compilation_unit_ID,
with_clause_ID,
limited_with_clause_ID,
nonlimited_with_clause_ID,
body_stub_ID,
subprogram_body_stub_ID,
package_body_stub_ID,
task_body_stub_ID,
protected_body_stub_ID,
subunit_ID,
exception_declaration_ID,
exception_handler_list_ID,
handled_sequence_of_statements_ID,
exception_choice_list_ID,
exception_handler_ID,
choice_parameter_specification_ID,
exception_choice_ID,
raise_statement_ID,
raise_expression_ID,
generic_declaration_ID,
generic_subprogram_declaration_ID,
generic_package_declaration_ID,
generic_formal_part_ID,
generic_formal_parameter_declaration_ID,
generic_instantiation_ID,
formal_object_declaration_ID,
formal_type_declaration_ID,
formal_complete_type_declaration_ID,
formal_incomplete_type_declaration_ID,
formal_type_definition_ID,
formal_private_type_definition_ID,
formal_derived_type_definition_ID,
formal_discrete_type_definition_ID,
formal_signed_integer_type_definition_ID,
formal_modular_type_definition_ID,
formal_floating_point_definition_ID,
formal_ordinary_fixed_point_definition_ID,
formal_decimal_fixed_point_definition_ID,
formal_array_type_definition_ID,
formal_access_type_definition_ID,
formal_interface_type_definition_ID,
formal_subprogram_declaration_ID,
formal_concrete_subprogram_declaration_ID,
formal_abstract_subprogram_declaration_ID,
subprogram_default_ID,
default_name_ID,
formal_package_declaration_ID,
aspect_clause_ID,
aspect_association_ID,
aspect_mark_list_ID,
aspect_specification_ID,
aspect_mark_ID,
aspect_definition_ID,
attribute_definition_clause_ID,
enumeration_representation_clause_ID,
enumeration_aggregate_ID,
record_representation_clause_ID,
component_clause_ID,
position_ID,
first_bit_ID,
last_bit_ID,
extended_global_aspect_definition_ID,
extended_global_aspect_element_ID,
extended_global_mode_ID,
formal_parameter_designator_ID,
formal_parameter_set_ID,
formal_group_designator_ID,
dispatching_operation_set_ID,
dispatching_operation_specifier_ID,
delta_constraint_ID,
at_clause_ID,
mod_clause_ID,
discrete_range_COMMA_list_ID,
component_item_component_item_list_ID,
declarative_item_pragma_list_ID,
record_component_association_COMMA_list_ID,
declare_item_list_ID,
statement_statement_list_ID,
label_list_ID,
global_aspect_element_COMMA_list_ID,
generic_formal_parameter_declaration_list_ID,
term_binary_adding_operator_list_ID,
component_clause_list_ID,
Wisi_SOI_ID);
type Token_Enum_ID_Array is array (Positive range <>) of Token_Enum_ID;
use all type WisiToken.Token_ID;
function "+" (Item : in Token_Enum_ID) return WisiToken.Token_ID
is (WisiToken.Token_ID'First + Token_Enum_ID'Pos (Item));
function To_Token_Enum (Item : in WisiToken.Token_ID) return Token_Enum_ID
is (Token_Enum_ID'Val (Item - WisiToken.Token_ID'First));
function "-" (Item : in WisiToken.Token_ID) return Token_Enum_ID renames To_Token_Enum;
procedure pragma_argument_association_list_0
(User_Data : in out WisiToken.Syntax_Trees.User_Data_Type'Class;
Tree : in out WisiToken.Syntax_Trees.Tree;
Nonterm : in WisiToken.Syntax_Trees.Valid_Node_Access);
procedure pragma_argument_association_list_1
(User_Data : in out WisiToken.Syntax_Trees.User_Data_Type'Class;
Tree : in out WisiToken.Syntax_Trees.Tree;
Nonterm : in WisiToken.Syntax_Trees.Valid_Node_Access);
procedure pragma_g_0
(User_Data : in out WisiToken.Syntax_Trees.User_Data_Type'Class;
Tree : in out WisiToken.Syntax_Trees.Tree;
Nonterm : in WisiToken.Syntax_Trees.Valid_Node_Access);
procedure pragma_g_1
(User_Data : in out WisiToken.Syntax_Trees.User_Data_Type'Class;
Tree : in out WisiToken.Syntax_Trees.Tree;
Nonterm : in WisiToken.Syntax_Trees.Valid_Node_Access);
procedure pragma_g_2
(User_Data : in out WisiToken.Syntax_Trees.User_Data_Type'Class;
Tree : in out WisiToken.Syntax_Trees.Tree;
Nonterm : in WisiToken.Syntax_Trees.Valid_Node_Access);
procedure pragma_g_3
(User_Data : in out WisiToken.Syntax_Trees.User_Data_Type'Class;
Tree : in out WisiToken.Syntax_Trees.Tree;
Nonterm : in WisiToken.Syntax_Trees.Valid_Node_Access);
procedure full_type_declaration_0
(User_Data : in out WisiToken.Syntax_Trees.User_Data_Type'Class;
Tree : in out WisiToken.Syntax_Trees.Tree;
Nonterm : in WisiToken.Syntax_Trees.Valid_Node_Access);
procedure full_type_declaration_1
(User_Data : in out WisiToken.Syntax_Trees.User_Data_Type'Class;
Tree : in out WisiToken.Syntax_Trees.Tree;
Nonterm : in WisiToken.Syntax_Trees.Valid_Node_Access);
procedure full_type_declaration_2
(User_Data : in out WisiToken.Syntax_Trees.User_Data_Type'Class;
Tree : in out WisiToken.Syntax_Trees.Tree;
Nonterm : in WisiToken.Syntax_Trees.Valid_Node_Access);
procedure full_type_declaration_3
(User_Data : in out WisiToken.Syntax_Trees.User_Data_Type'Class;
Tree : in out WisiToken.Syntax_Trees.Tree;
Nonterm : in WisiToken.Syntax_Trees.Valid_Node_Access);
procedure subtype_declaration_0
(User_Data : in out WisiToken.Syntax_Trees.User_Data_Type'Class;
Tree : in out WisiToken.Syntax_Trees.Tree;
Nonterm : in WisiToken.Syntax_Trees.Valid_Node_Access);
procedure subtype_declaration_1
(User_Data : in out WisiToken.Syntax_Trees.User_Data_Type'Class;
Tree : in out WisiToken.Syntax_Trees.Tree;
Nonterm : in WisiToken.Syntax_Trees.Valid_Node_Access);
procedure object_declaration_0
(User_Data : in out WisiToken.Syntax_Trees.User_Data_Type'Class;
Tree : in out WisiToken.Syntax_Trees.Tree;
Nonterm : in WisiToken.Syntax_Trees.Valid_Node_Access);
procedure object_declaration_1
(User_Data : in out WisiToken.Syntax_Trees.User_Data_Type'Class;
Tree : in out WisiToken.Syntax_Trees.Tree;
Nonterm : in WisiToken.Syntax_Trees.Valid_Node_Access);
procedure object_declaration_2
(User_Data : in out WisiToken.Syntax_Trees.User_Data_Type'Class;
Tree : in out WisiToken.Syntax_Trees.Tree;
Nonterm : in WisiToken.Syntax_Trees.Valid_Node_Access);
procedure object_declaration_3
(User_Data : in out WisiToken.Syntax_Trees.User_Data_Type'Class;
Tree : in out WisiToken.Syntax_Trees.Tree;
Nonterm : in WisiToken.Syntax_Trees.Valid_Node_Access);
procedure object_declaration_4
(User_Data : in out WisiToken.Syntax_Trees.User_Data_Type'Class;
Tree : in out WisiToken.Syntax_Trees.Tree;
Nonterm : in WisiToken.Syntax_Trees.Valid_Node_Access);
procedure object_declaration_5
(User_Data : in out WisiToken.Syntax_Trees.User_Data_Type'Class;
Tree : in out WisiToken.Syntax_Trees.Tree;
Nonterm : in WisiToken.Syntax_Trees.Valid_Node_Access);
procedure object_declaration_6
(User_Data : in out WisiToken.Syntax_Trees.User_Data_Type'Class;
Tree : in out WisiToken.Syntax_Trees.Tree;
Nonterm : in WisiToken.Syntax_Trees.Valid_Node_Access);
procedure object_declaration_7
(User_Data : in out WisiToken.Syntax_Trees.User_Data_Type'Class;
Tree : in out WisiToken.Syntax_Trees.Tree;
Nonterm : in WisiToken.Syntax_Trees.Valid_Node_Access);
procedure object_declaration_8
(User_Data : in out WisiToken.Syntax_Trees.User_Data_Type'Class;
Tree : in out WisiToken.Syntax_Trees.Tree;
Nonterm : in WisiToken.Syntax_Trees.Valid_Node_Access);
procedure object_declaration_9
(User_Data : in out WisiToken.Syntax_Trees.User_Data_Type'Class;
Tree : in out WisiToken.Syntax_Trees.Tree;
Nonterm : in WisiToken.Syntax_Trees.Valid_Node_Access);
procedure object_declaration_10
(User_Data : in out WisiToken.Syntax_Trees.User_Data_Type'Class;
Tree : in out WisiToken.Syntax_Trees.Tree;
Nonterm : in WisiToken.Syntax_Trees.Valid_Node_Access);
procedure object_declaration_11
(User_Data : in out WisiToken.Syntax_Trees.User_Data_Type'Class;
Tree : in out WisiToken.Syntax_Trees.Tree;
Nonterm : in WisiToken.Syntax_Trees.Valid_Node_Access);
procedure object_declaration_12
(User_Data : in out WisiToken.Syntax_Trees.User_Data_Type'Class;
Tree : in out WisiToken.Syntax_Trees.Tree;
Nonterm : in WisiToken.Syntax_Trees.Valid_Node_Access);
procedure object_declaration_13
(User_Data : in out WisiToken.Syntax_Trees.User_Data_Type'Class;
Tree : in out WisiToken.Syntax_Trees.Tree;
Nonterm : in WisiToken.Syntax_Trees.Valid_Node_Access);
procedure object_declaration_14
(User_Data : in out WisiToken.Syntax_Trees.User_Data_Type'Class;
Tree : in out WisiToken.Syntax_Trees.Tree;
Nonterm : in WisiToken.Syntax_Trees.Valid_Node_Access);
procedure object_declaration_15
(User_Data : in out WisiToken.Syntax_Trees.User_Data_Type'Class;
Tree : in out WisiToken.Syntax_Trees.Tree;
Nonterm : in WisiToken.Syntax_Trees.Valid_Node_Access);
procedure object_declaration_16
(User_Data : in out WisiToken.Syntax_Trees.User_Data_Type'Class;
Tree : in out WisiToken.Syntax_Trees.Tree;
Nonterm : in WisiToken.Syntax_Trees.Valid_Node_Access);
procedure object_declaration_17
(User_Data : in out WisiToken.Syntax_Trees.User_Data_Type'Class;
Tree : in out WisiToken.Syntax_Trees.Tree;
Nonterm : in WisiToken.Syntax_Trees.Valid_Node_Access);
procedure object_declaration_18
(User_Data : in out WisiToken.Syntax_Trees.User_Data_Type'Class;
Tree : in out WisiToken.Syntax_Trees.Tree;
Nonterm : in WisiToken.Syntax_Trees.Valid_Node_Access);
procedure object_declaration_19
(User_Data : in out WisiToken.Syntax_Trees.User_Data_Type'Class;
Tree : in out WisiToken.Syntax_Trees.Tree;
Nonterm : in WisiToken.Syntax_Trees.Valid_Node_Access);
procedure object_declaration_20
(User_Data : in out WisiToken.Syntax_Trees.User_Data_Type'Class;
Tree : in out WisiToken.Syntax_Trees.Tree;
Nonterm : in WisiToken.Syntax_Trees.Valid_Node_Access);
procedure object_declaration_21
(User_Data : in out WisiToken.Syntax_Trees.User_Data_Type'Class;
Tree : in out WisiToken.Syntax_Trees.Tree;
Nonterm : in WisiToken.Syntax_Trees.Valid_Node_Access);
procedure object_declaration_22
(User_Data : in out WisiToken.Syntax_Trees.User_Data_Type'Class;
Tree : in out WisiToken.Syntax_Trees.Tree;
Nonterm : in WisiToken.Syntax_Trees.Valid_Node_Access);
procedure object_declaration_23
(User_Data : in out WisiToken.Syntax_Trees.User_Data_Type'Class;
Tree : in out WisiToken.Syntax_Trees.Tree;
Nonterm : in WisiToken.Syntax_Trees.Valid_Node_Access);
procedure object_declaration_24
(User_Data : in out WisiToken.Syntax_Trees.User_Data_Type'Class;
Tree : in out WisiToken.Syntax_Trees.Tree;
Nonterm : in WisiToken.Syntax_Trees.Valid_Node_Access);
procedure object_declaration_25
(User_Data : in out WisiToken.Syntax_Trees.User_Data_Type'Class;
Tree : in out WisiToken.Syntax_Trees.Tree;
Nonterm : in WisiToken.Syntax_Trees.Valid_Node_Access);
procedure object_declaration_26
(User_Data : in out WisiToken.Syntax_Trees.User_Data_Type'Class;
Tree : in out WisiToken.Syntax_Trees.Tree;
Nonterm : in WisiToken.Syntax_Trees.Valid_Node_Access);
procedure object_declaration_27
(User_Data : in out WisiToken.Syntax_Trees.User_Data_Type'Class;
Tree : in out WisiToken.Syntax_Trees.Tree;
Nonterm : in WisiToken.Syntax_Trees.Valid_Node_Access);
procedure object_declaration_28
(User_Data : in out WisiToken.Syntax_Trees.User_Data_Type'Class;
Tree : in out WisiToken.Syntax_Trees.Tree;
Nonterm : in WisiToken.Syntax_Trees.Valid_Node_Access);
procedure object_declaration_29
(User_Data : in out WisiToken.Syntax_Trees.User_Data_Type'Class;
Tree : in out WisiToken.Syntax_Trees.Tree;
Nonterm : in WisiToken.Syntax_Trees.Valid_Node_Access);
procedure object_declaration_30
(User_Data : in out WisiToken.Syntax_Trees.User_Data_Type'Class;
Tree : in out WisiToken.Syntax_Trees.Tree;
Nonterm : in WisiToken.Syntax_Trees.Valid_Node_Access);
procedure object_declaration_31
(User_Data : in out WisiToken.Syntax_Trees.User_Data_Type'Class;
Tree : in out WisiToken.Syntax_Trees.Tree;
Nonterm : in WisiToken.Syntax_Trees.Valid_Node_Access);
procedure object_declaration_32
(User_Data : in out WisiToken.Syntax_Trees.User_Data_Type'Class;
Tree : in out WisiToken.Syntax_Trees.Tree;
Nonterm : in WisiToken.Syntax_Trees.Valid_Node_Access);
procedure object_declaration_33
(User_Data : in out WisiToken.Syntax_Trees.User_Data_Type'Class;
Tree : in out WisiToken.Syntax_Trees.Tree;
Nonterm : in WisiToken.Syntax_Trees.Valid_Node_Access);
procedure object_declaration_34
(User_Data : in out WisiToken.Syntax_Trees.User_Data_Type'Class;
Tree : in out WisiToken.Syntax_Trees.Tree;
Nonterm : in WisiToken.Syntax_Trees.Valid_Node_Access);
procedure object_declaration_35
(User_Data : in out WisiToken.Syntax_Trees.User_Data_Type'Class;
Tree : in out WisiToken.Syntax_Trees.Tree;
Nonterm : in WisiToken.Syntax_Trees.Valid_Node_Access);
procedure object_declaration_36
(User_Data : in out WisiToken.Syntax_Trees.User_Data_Type'Class;
Tree : in out WisiToken.Syntax_Trees.Tree;
Nonterm : in WisiToken.Syntax_Trees.Valid_Node_Access);
procedure object_declaration_37
(User_Data : in out WisiToken.Syntax_Trees.User_Data_Type'Class;
Tree : in out WisiToken.Syntax_Trees.Tree;
Nonterm : in WisiToken.Syntax_Trees.Valid_Node_Access);
procedure object_declaration_38
(User_Data : in out WisiToken.Syntax_Trees.User_Data_Type'Class;
Tree : in out WisiToken.Syntax_Trees.Tree;
Nonterm : in WisiToken.Syntax_Trees.Valid_Node_Access);
procedure object_declaration_39
(User_Data : in out WisiToken.Syntax_Trees.User_Data_Type'Class;
Tree : in out WisiToken.Syntax_Trees.Tree;
Nonterm : in WisiToken.Syntax_Trees.Valid_Node_Access);
procedure object_declaration_40
(User_Data : in out WisiToken.Syntax_Trees.User_Data_Type'Class;
Tree : in out WisiToken.Syntax_Trees.Tree;
Nonterm : in WisiToken.Syntax_Trees.Valid_Node_Access);
procedure object_declaration_41
(User_Data : in out WisiToken.Syntax_Trees.User_Data_Type'Class;
Tree : in out WisiToken.Syntax_Trees.Tree;
Nonterm : in WisiToken.Syntax_Trees.Valid_Node_Access);
procedure object_declaration_42
(User_Data : in out WisiToken.Syntax_Trees.User_Data_Type'Class;
Tree : in out WisiToken.Syntax_Trees.Tree;
Nonterm : in WisiToken.Syntax_Trees.Valid_Node_Access);
procedure object_declaration_43
(User_Data : in out WisiToken.Syntax_Trees.User_Data_Type'Class;
Tree : in out WisiToken.Syntax_Trees.Tree;
Nonterm : in WisiToken.Syntax_Trees.Valid_Node_Access);
procedure object_declaration_44
(User_Data : in out WisiToken.Syntax_Trees.User_Data_Type'Class;
Tree : in out WisiToken.Syntax_Trees.Tree;
Nonterm : in WisiToken.Syntax_Trees.Valid_Node_Access);
procedure object_declaration_45
(User_Data : in out WisiToken.Syntax_Trees.User_Data_Type'Class;
Tree : in out WisiToken.Syntax_Trees.Tree;
Nonterm : in WisiToken.Syntax_Trees.Valid_Node_Access);
procedure object_declaration_46
(User_Data : in out WisiToken.Syntax_Trees.User_Data_Type'Class;
Tree : in out WisiToken.Syntax_Trees.Tree;
Nonterm : in WisiToken.Syntax_Trees.Valid_Node_Access);
procedure object_declaration_47
(User_Data : in out WisiToken.Syntax_Trees.User_Data_Type'Class;
Tree : in out WisiToken.Syntax_Trees.Tree;
Nonterm : in WisiToken.Syntax_Trees.Valid_Node_Access);
procedure defining_identifier_list_0
(User_Data : in out WisiToken.Syntax_Trees.User_Data_Type'Class;
Tree : in out WisiToken.Syntax_Trees.Tree;
Nonterm : in WisiToken.Syntax_Trees.Valid_Node_Access);
procedure defining_identifier_list_1
(User_Data : in out WisiToken.Syntax_Trees.User_Data_Type'Class;
Tree : in out WisiToken.Syntax_Trees.Tree;
Nonterm : in WisiToken.Syntax_Trees.Valid_Node_Access);
procedure number_declaration_0
(User_Data : in out WisiToken.Syntax_Trees.User_Data_Type'Class;
Tree : in out WisiToken.Syntax_Trees.Tree;
Nonterm : in WisiToken.Syntax_Trees.Valid_Node_Access);
procedure enumeration_type_definition_0
(User_Data : in out WisiToken.Syntax_Trees.User_Data_Type'Class;
Tree : in out WisiToken.Syntax_Trees.Tree;
Nonterm : in WisiToken.Syntax_Trees.Valid_Node_Access);
procedure integer_type_definition_0
(User_Data : in out WisiToken.Syntax_Trees.User_Data_Type'Class;
Tree : in out WisiToken.Syntax_Trees.Tree;
Nonterm : in WisiToken.Syntax_Trees.Valid_Node_Access);
procedure integer_type_definition_1
(User_Data : in out WisiToken.Syntax_Trees.User_Data_Type'Class;
Tree : in out WisiToken.Syntax_Trees.Tree;
Nonterm : in WisiToken.Syntax_Trees.Valid_Node_Access);
procedure unconstrained_array_definition_0
(User_Data : in out WisiToken.Syntax_Trees.User_Data_Type'Class;
Tree : in out WisiToken.Syntax_Trees.Tree;
Nonterm : in WisiToken.Syntax_Trees.Valid_Node_Access);
procedure constrained_array_definition_0
(User_Data : in out WisiToken.Syntax_Trees.User_Data_Type'Class;
Tree : in out WisiToken.Syntax_Trees.Tree;
Nonterm : in WisiToken.Syntax_Trees.Valid_Node_Access);
procedure discrete_range_0
(User_Data : in out WisiToken.Syntax_Trees.User_Data_Type'Class;
Tree : in out WisiToken.Syntax_Trees.Tree;
Nonterm : in WisiToken.Syntax_Trees.Valid_Node_Access);
procedure discrete_range_1
(User_Data : in out WisiToken.Syntax_Trees.User_Data_Type'Class;
Tree : in out WisiToken.Syntax_Trees.Tree;
Nonterm : in WisiToken.Syntax_Trees.Valid_Node_Access);
procedure known_discriminant_part_0
(User_Data : in out WisiToken.Syntax_Trees.User_Data_Type'Class;
Tree : in out WisiToken.Syntax_Trees.Tree;
Nonterm : in WisiToken.Syntax_Trees.Valid_Node_Access);
procedure discriminant_specification_0
(User_Data : in out WisiToken.Syntax_Trees.User_Data_Type'Class;
Tree : in out WisiToken.Syntax_Trees.Tree;
Nonterm : in WisiToken.Syntax_Trees.Valid_Node_Access);
procedure discriminant_specification_1
(User_Data : in out WisiToken.Syntax_Trees.User_Data_Type'Class;
Tree : in out WisiToken.Syntax_Trees.Tree;
Nonterm : in WisiToken.Syntax_Trees.Valid_Node_Access);
procedure discriminant_specification_2
(User_Data : in out WisiToken.Syntax_Trees.User_Data_Type'Class;
Tree : in out WisiToken.Syntax_Trees.Tree;
Nonterm : in WisiToken.Syntax_Trees.Valid_Node_Access);
procedure discriminant_specification_3
(User_Data : in out WisiToken.Syntax_Trees.User_Data_Type'Class;
Tree : in out WisiToken.Syntax_Trees.Tree;
Nonterm : in WisiToken.Syntax_Trees.Valid_Node_Access);
procedure discriminant_specification_4
(User_Data : in out WisiToken.Syntax_Trees.User_Data_Type'Class;
Tree : in out WisiToken.Syntax_Trees.Tree;
Nonterm : in WisiToken.Syntax_Trees.Valid_Node_Access);
procedure discriminant_specification_5
(User_Data : in out WisiToken.Syntax_Trees.User_Data_Type'Class;
Tree : in out WisiToken.Syntax_Trees.Tree;
Nonterm : in WisiToken.Syntax_Trees.Valid_Node_Access);
procedure record_definition_0
(User_Data : in out WisiToken.Syntax_Trees.User_Data_Type'Class;
Tree : in out WisiToken.Syntax_Trees.Tree;
Nonterm : in WisiToken.Syntax_Trees.Valid_Node_Access);
procedure record_definition_1
(User_Data : in out WisiToken.Syntax_Trees.User_Data_Type'Class;
Tree : in out WisiToken.Syntax_Trees.Tree;
Nonterm : in WisiToken.Syntax_Trees.Valid_Node_Access);
procedure component_list_3
(User_Data : in out WisiToken.Syntax_Trees.User_Data_Type'Class;
Tree : in out WisiToken.Syntax_Trees.Tree;
Nonterm : in WisiToken.Syntax_Trees.Valid_Node_Access);
procedure component_declaration_0
(User_Data : in out WisiToken.Syntax_Trees.User_Data_Type'Class;
Tree : in out WisiToken.Syntax_Trees.Tree;
Nonterm : in WisiToken.Syntax_Trees.Valid_Node_Access);
procedure component_declaration_1
(User_Data : in out WisiToken.Syntax_Trees.User_Data_Type'Class;
Tree : in out WisiToken.Syntax_Trees.Tree;
Nonterm : in WisiToken.Syntax_Trees.Valid_Node_Access);
procedure component_declaration_2
(User_Data : in out WisiToken.Syntax_Trees.User_Data_Type'Class;
Tree : in out WisiToken.Syntax_Trees.Tree;
Nonterm : in WisiToken.Syntax_Trees.Valid_Node_Access);
procedure component_declaration_3
(User_Data : in out WisiToken.Syntax_Trees.User_Data_Type'Class;
Tree : in out WisiToken.Syntax_Trees.Tree;
Nonterm : in WisiToken.Syntax_Trees.Valid_Node_Access);
procedure variant_list_1
(User_Data : in out WisiToken.Syntax_Trees.User_Data_Type'Class;
Tree : in out WisiToken.Syntax_Trees.Tree;
Nonterm : in WisiToken.Syntax_Trees.Valid_Node_Access);
procedure variant_part_0
(User_Data : in out WisiToken.Syntax_Trees.User_Data_Type'Class;
Tree : in out WisiToken.Syntax_Trees.Tree;
Nonterm : in WisiToken.Syntax_Trees.Valid_Node_Access);
procedure variant_0
(User_Data : in out WisiToken.Syntax_Trees.User_Data_Type'Class;
Tree : in out WisiToken.Syntax_Trees.Tree;
Nonterm : in WisiToken.Syntax_Trees.Valid_Node_Access);
procedure discrete_choice_0
(User_Data : in out WisiToken.Syntax_Trees.User_Data_Type'Class;
Tree : in out WisiToken.Syntax_Trees.Tree;
Nonterm : in WisiToken.Syntax_Trees.Valid_Node_Access);
procedure discrete_choice_1
(User_Data : in out WisiToken.Syntax_Trees.User_Data_Type'Class;
Tree : in out WisiToken.Syntax_Trees.Tree;
Nonterm : in WisiToken.Syntax_Trees.Valid_Node_Access);
procedure discrete_choice_2
(User_Data : in out WisiToken.Syntax_Trees.User_Data_Type'Class;
Tree : in out WisiToken.Syntax_Trees.Tree;
Nonterm : in WisiToken.Syntax_Trees.Valid_Node_Access);
procedure record_extension_part_0
(User_Data : in out WisiToken.Syntax_Trees.User_Data_Type'Class;
Tree : in out WisiToken.Syntax_Trees.Tree;
Nonterm : in WisiToken.Syntax_Trees.Valid_Node_Access);
procedure abstract_subprogram_declaration_0
(User_Data : in out WisiToken.Syntax_Trees.User_Data_Type'Class;
Tree : in out WisiToken.Syntax_Trees.Tree;
Nonterm : in WisiToken.Syntax_Trees.Valid_Node_Access);
procedure abstract_subprogram_declaration_1
(User_Data : in out WisiToken.Syntax_Trees.User_Data_Type'Class;
Tree : in out WisiToken.Syntax_Trees.Tree;
Nonterm : in WisiToken.Syntax_Trees.Valid_Node_Access);
procedure abstract_subprogram_declaration_2
(User_Data : in out WisiToken.Syntax_Trees.User_Data_Type'Class;
Tree : in out WisiToken.Syntax_Trees.Tree;
Nonterm : in WisiToken.Syntax_Trees.Valid_Node_Access);
procedure abstract_subprogram_declaration_3
(User_Data : in out WisiToken.Syntax_Trees.User_Data_Type'Class;
Tree : in out WisiToken.Syntax_Trees.Tree;
Nonterm : in WisiToken.Syntax_Trees.Valid_Node_Access);
procedure interface_list_0
(User_Data : in out WisiToken.Syntax_Trees.User_Data_Type'Class;
Tree : in out WisiToken.Syntax_Trees.Tree;
Nonterm : in WisiToken.Syntax_Trees.Valid_Node_Access);
procedure interface_list_1
(User_Data : in out WisiToken.Syntax_Trees.User_Data_Type'Class;
Tree : in out WisiToken.Syntax_Trees.Tree;
Nonterm : in WisiToken.Syntax_Trees.Valid_Node_Access);
procedure access_to_subprogram_definition_0
(User_Data : in out WisiToken.Syntax_Trees.User_Data_Type'Class;
Tree : in out WisiToken.Syntax_Trees.Tree;
Nonterm : in WisiToken.Syntax_Trees.Valid_Node_Access);
procedure access_to_subprogram_definition_1
(User_Data : in out WisiToken.Syntax_Trees.User_Data_Type'Class;
Tree : in out WisiToken.Syntax_Trees.Tree;
Nonterm : in WisiToken.Syntax_Trees.Valid_Node_Access);
procedure access_definition_0
(User_Data : in out WisiToken.Syntax_Trees.User_Data_Type'Class;
Tree : in out WisiToken.Syntax_Trees.Tree;
Nonterm : in WisiToken.Syntax_Trees.Valid_Node_Access);
procedure access_definition_1
(User_Data : in out WisiToken.Syntax_Trees.User_Data_Type'Class;
Tree : in out WisiToken.Syntax_Trees.Tree;
Nonterm : in WisiToken.Syntax_Trees.Valid_Node_Access);
procedure access_definition_2
(User_Data : in out WisiToken.Syntax_Trees.User_Data_Type'Class;
Tree : in out WisiToken.Syntax_Trees.Tree;
Nonterm : in WisiToken.Syntax_Trees.Valid_Node_Access);
procedure access_definition_3
(User_Data : in out WisiToken.Syntax_Trees.User_Data_Type'Class;
Tree : in out WisiToken.Syntax_Trees.Tree;
Nonterm : in WisiToken.Syntax_Trees.Valid_Node_Access);
procedure access_definition_4
(User_Data : in out WisiToken.Syntax_Trees.User_Data_Type'Class;
Tree : in out WisiToken.Syntax_Trees.Tree;
Nonterm : in WisiToken.Syntax_Trees.Valid_Node_Access);
procedure access_definition_5
(User_Data : in out WisiToken.Syntax_Trees.User_Data_Type'Class;
Tree : in out WisiToken.Syntax_Trees.Tree;
Nonterm : in WisiToken.Syntax_Trees.Valid_Node_Access);
procedure access_definition_6
(User_Data : in out WisiToken.Syntax_Trees.User_Data_Type'Class;
Tree : in out WisiToken.Syntax_Trees.Tree;
Nonterm : in WisiToken.Syntax_Trees.Valid_Node_Access);
procedure access_definition_7
(User_Data : in out WisiToken.Syntax_Trees.User_Data_Type'Class;
Tree : in out WisiToken.Syntax_Trees.Tree;
Nonterm : in WisiToken.Syntax_Trees.Valid_Node_Access);
procedure access_definition_8
(User_Data : in out WisiToken.Syntax_Trees.User_Data_Type'Class;
Tree : in out WisiToken.Syntax_Trees.Tree;
Nonterm : in WisiToken.Syntax_Trees.Valid_Node_Access);
procedure access_definition_9
(User_Data : in out WisiToken.Syntax_Trees.User_Data_Type'Class;
Tree : in out WisiToken.Syntax_Trees.Tree;
Nonterm : in WisiToken.Syntax_Trees.Valid_Node_Access);
procedure access_definition_10
(User_Data : in out WisiToken.Syntax_Trees.User_Data_Type'Class;
Tree : in out WisiToken.Syntax_Trees.Tree;
Nonterm : in WisiToken.Syntax_Trees.Valid_Node_Access);
procedure access_definition_11
(User_Data : in out WisiToken.Syntax_Trees.User_Data_Type'Class;
Tree : in out WisiToken.Syntax_Trees.Tree;
Nonterm : in WisiToken.Syntax_Trees.Valid_Node_Access);
procedure incomplete_type_declaration_0
(User_Data : in out WisiToken.Syntax_Trees.User_Data_Type'Class;
Tree : in out WisiToken.Syntax_Trees.Tree;
Nonterm : in WisiToken.Syntax_Trees.Valid_Node_Access);
procedure incomplete_type_declaration_1
(User_Data : in out WisiToken.Syntax_Trees.User_Data_Type'Class;
Tree : in out WisiToken.Syntax_Trees.Tree;
Nonterm : in WisiToken.Syntax_Trees.Valid_Node_Access);
procedure incomplete_type_declaration_2
(User_Data : in out WisiToken.Syntax_Trees.User_Data_Type'Class;
Tree : in out WisiToken.Syntax_Trees.Tree;
Nonterm : in WisiToken.Syntax_Trees.Valid_Node_Access);
procedure incomplete_type_declaration_3
(User_Data : in out WisiToken.Syntax_Trees.User_Data_Type'Class;
Tree : in out WisiToken.Syntax_Trees.Tree;
Nonterm : in WisiToken.Syntax_Trees.Valid_Node_Access);
procedure direct_name_0
(User_Data : in out WisiToken.Syntax_Trees.User_Data_Type'Class;
Tree : in out WisiToken.Syntax_Trees.Tree;
Nonterm : in WisiToken.Syntax_Trees.Valid_Node_Access);
procedure slice_0
(User_Data : in out WisiToken.Syntax_Trees.User_Data_Type'Class;
Tree : in out WisiToken.Syntax_Trees.Tree;
Nonterm : in WisiToken.Syntax_Trees.Valid_Node_Access);
procedure selected_component_0
(User_Data : in out WisiToken.Syntax_Trees.User_Data_Type'Class;
Tree : in out WisiToken.Syntax_Trees.Tree;
Nonterm : in WisiToken.Syntax_Trees.Valid_Node_Access);
procedure range_attribute_designator_0
(User_Data : in out WisiToken.Syntax_Trees.User_Data_Type'Class;
Tree : in out WisiToken.Syntax_Trees.Tree;
Nonterm : in WisiToken.Syntax_Trees.Valid_Node_Access);
procedure range_attribute_designator_1
(User_Data : in out WisiToken.Syntax_Trees.User_Data_Type'Class;
Tree : in out WisiToken.Syntax_Trees.Tree;
Nonterm : in WisiToken.Syntax_Trees.Valid_Node_Access);
procedure aggregate_4
(User_Data : in out WisiToken.Syntax_Trees.User_Data_Type'Class;
Tree : in out WisiToken.Syntax_Trees.Tree;
Nonterm : in WisiToken.Syntax_Trees.Valid_Node_Access);
procedure aggregate_5
(User_Data : in out WisiToken.Syntax_Trees.User_Data_Type'Class;
Tree : in out WisiToken.Syntax_Trees.Tree;
Nonterm : in WisiToken.Syntax_Trees.Valid_Node_Access);
procedure aggregate_6
(User_Data : in out WisiToken.Syntax_Trees.User_Data_Type'Class;
Tree : in out WisiToken.Syntax_Trees.Tree;
Nonterm : in WisiToken.Syntax_Trees.Valid_Node_Access);
procedure record_aggregate_0
(User_Data : in out WisiToken.Syntax_Trees.User_Data_Type'Class;
Tree : in out WisiToken.Syntax_Trees.Tree;
Nonterm : in WisiToken.Syntax_Trees.Valid_Node_Access);
procedure record_component_association_0
(User_Data : in out WisiToken.Syntax_Trees.User_Data_Type'Class;
Tree : in out WisiToken.Syntax_Trees.Tree;
Nonterm : in WisiToken.Syntax_Trees.Valid_Node_Access);
procedure record_component_association_1
(User_Data : in out WisiToken.Syntax_Trees.User_Data_Type'Class;
Tree : in out WisiToken.Syntax_Trees.Tree;
Nonterm : in WisiToken.Syntax_Trees.Valid_Node_Access);
procedure component_choice_list_1
(User_Data : in out WisiToken.Syntax_Trees.User_Data_Type'Class;
Tree : in out WisiToken.Syntax_Trees.Tree;
Nonterm : in WisiToken.Syntax_Trees.Valid_Node_Access);
procedure extension_aggregate_0
(User_Data : in out WisiToken.Syntax_Trees.User_Data_Type'Class;
Tree : in out WisiToken.Syntax_Trees.Tree;
Nonterm : in WisiToken.Syntax_Trees.Valid_Node_Access);
procedure expression_list_0
(User_Data : in out WisiToken.Syntax_Trees.User_Data_Type'Class;
Tree : in out WisiToken.Syntax_Trees.Tree;
Nonterm : in WisiToken.Syntax_Trees.Valid_Node_Access);
procedure expression_list_1
(User_Data : in out WisiToken.Syntax_Trees.User_Data_Type'Class;
Tree : in out WisiToken.Syntax_Trees.Tree;
Nonterm : in WisiToken.Syntax_Trees.Valid_Node_Access);
procedure positional_array_aggregate_0
(User_Data : in out WisiToken.Syntax_Trees.User_Data_Type'Class;
Tree : in out WisiToken.Syntax_Trees.Tree;
Nonterm : in WisiToken.Syntax_Trees.Valid_Node_Access);
procedure positional_array_aggregate_1
(User_Data : in out WisiToken.Syntax_Trees.User_Data_Type'Class;
Tree : in out WisiToken.Syntax_Trees.Tree;
Nonterm : in WisiToken.Syntax_Trees.Valid_Node_Access);
procedure positional_array_aggregate_2
(User_Data : in out WisiToken.Syntax_Trees.User_Data_Type'Class;
Tree : in out WisiToken.Syntax_Trees.Tree;
Nonterm : in WisiToken.Syntax_Trees.Valid_Node_Access);
procedure positional_array_aggregate_3
(User_Data : in out WisiToken.Syntax_Trees.User_Data_Type'Class;
Tree : in out WisiToken.Syntax_Trees.Tree;
Nonterm : in WisiToken.Syntax_Trees.Valid_Node_Access);
procedure named_array_aggregate_0
(User_Data : in out WisiToken.Syntax_Trees.User_Data_Type'Class;
Tree : in out WisiToken.Syntax_Trees.Tree;
Nonterm : in WisiToken.Syntax_Trees.Valid_Node_Access);
procedure named_array_aggregate_1
(User_Data : in out WisiToken.Syntax_Trees.User_Data_Type'Class;
Tree : in out WisiToken.Syntax_Trees.Tree;
Nonterm : in WisiToken.Syntax_Trees.Valid_Node_Access);
procedure array_component_association_0
(User_Data : in out WisiToken.Syntax_Trees.User_Data_Type'Class;
Tree : in out WisiToken.Syntax_Trees.Tree;
Nonterm : in WisiToken.Syntax_Trees.Valid_Node_Access);
procedure record_delta_aggregate_0
(User_Data : in out WisiToken.Syntax_Trees.User_Data_Type'Class;
Tree : in out WisiToken.Syntax_Trees.Tree;
Nonterm : in WisiToken.Syntax_Trees.Valid_Node_Access);
procedure array_delta_aggregate_0
(User_Data : in out WisiToken.Syntax_Trees.User_Data_Type'Class;
Tree : in out WisiToken.Syntax_Trees.Tree;
Nonterm : in WisiToken.Syntax_Trees.Valid_Node_Access);
procedure array_delta_aggregate_1
(User_Data : in out WisiToken.Syntax_Trees.User_Data_Type'Class;
Tree : in out WisiToken.Syntax_Trees.Tree;
Nonterm : in WisiToken.Syntax_Trees.Valid_Node_Access);
procedure iterated_element_association_0
(User_Data : in out WisiToken.Syntax_Trees.User_Data_Type'Class;
Tree : in out WisiToken.Syntax_Trees.Tree;
Nonterm : in WisiToken.Syntax_Trees.Valid_Node_Access);
procedure iterated_element_association_1
(User_Data : in out WisiToken.Syntax_Trees.User_Data_Type'Class;
Tree : in out WisiToken.Syntax_Trees.Tree;
Nonterm : in WisiToken.Syntax_Trees.Valid_Node_Access);
procedure iterated_element_association_2
(User_Data : in out WisiToken.Syntax_Trees.User_Data_Type'Class;
Tree : in out WisiToken.Syntax_Trees.Tree;
Nonterm : in WisiToken.Syntax_Trees.Valid_Node_Access);
procedure iterated_element_association_3
(User_Data : in out WisiToken.Syntax_Trees.User_Data_Type'Class;
Tree : in out WisiToken.Syntax_Trees.Tree;
Nonterm : in WisiToken.Syntax_Trees.Valid_Node_Access);
procedure membership_choice_0
(User_Data : in out WisiToken.Syntax_Trees.User_Data_Type'Class;
Tree : in out WisiToken.Syntax_Trees.Tree;
Nonterm : in WisiToken.Syntax_Trees.Valid_Node_Access);
procedure membership_choice_1
(User_Data : in out WisiToken.Syntax_Trees.User_Data_Type'Class;
Tree : in out WisiToken.Syntax_Trees.Tree;
Nonterm : in WisiToken.Syntax_Trees.Valid_Node_Access);
procedure primary_0
(User_Data : in out WisiToken.Syntax_Trees.User_Data_Type'Class;
Tree : in out WisiToken.Syntax_Trees.Tree;
Nonterm : in WisiToken.Syntax_Trees.Valid_Node_Access);
procedure primary_2
(User_Data : in out WisiToken.Syntax_Trees.User_Data_Type'Class;
Tree : in out WisiToken.Syntax_Trees.Tree;
Nonterm : in WisiToken.Syntax_Trees.Valid_Node_Access);
procedure elsif_expression_item_0
(User_Data : in out WisiToken.Syntax_Trees.User_Data_Type'Class;
Tree : in out WisiToken.Syntax_Trees.Tree;
Nonterm : in WisiToken.Syntax_Trees.Valid_Node_Access);
procedure elsif_expression_list_1
(User_Data : in out WisiToken.Syntax_Trees.User_Data_Type'Class;
Tree : in out WisiToken.Syntax_Trees.Tree;
Nonterm : in WisiToken.Syntax_Trees.Valid_Node_Access);
procedure if_expression_0
(User_Data : in out WisiToken.Syntax_Trees.User_Data_Type'Class;
Tree : in out WisiToken.Syntax_Trees.Tree;
Nonterm : in WisiToken.Syntax_Trees.Valid_Node_Access);
procedure if_expression_1
(User_Data : in out WisiToken.Syntax_Trees.User_Data_Type'Class;
Tree : in out WisiToken.Syntax_Trees.Tree;
Nonterm : in WisiToken.Syntax_Trees.Valid_Node_Access);
procedure if_expression_2
(User_Data : in out WisiToken.Syntax_Trees.User_Data_Type'Class;
Tree : in out WisiToken.Syntax_Trees.Tree;
Nonterm : in WisiToken.Syntax_Trees.Valid_Node_Access);
procedure if_expression_3
(User_Data : in out WisiToken.Syntax_Trees.User_Data_Type'Class;
Tree : in out WisiToken.Syntax_Trees.Tree;
Nonterm : in WisiToken.Syntax_Trees.Valid_Node_Access);
procedure case_expression_alternative_list_1
(User_Data : in out WisiToken.Syntax_Trees.User_Data_Type'Class;
Tree : in out WisiToken.Syntax_Trees.Tree;
Nonterm : in WisiToken.Syntax_Trees.Valid_Node_Access);
procedure case_expression_0
(User_Data : in out WisiToken.Syntax_Trees.User_Data_Type'Class;
Tree : in out WisiToken.Syntax_Trees.Tree;
Nonterm : in WisiToken.Syntax_Trees.Valid_Node_Access);
procedure case_expression_alternative_0
(User_Data : in out WisiToken.Syntax_Trees.User_Data_Type'Class;
Tree : in out WisiToken.Syntax_Trees.Tree;
Nonterm : in WisiToken.Syntax_Trees.Valid_Node_Access);
procedure quantified_expression_0
(User_Data : in out WisiToken.Syntax_Trees.User_Data_Type'Class;
Tree : in out WisiToken.Syntax_Trees.Tree;
Nonterm : in WisiToken.Syntax_Trees.Valid_Node_Access);
procedure quantified_expression_1
(User_Data : in out WisiToken.Syntax_Trees.User_Data_Type'Class;
Tree : in out WisiToken.Syntax_Trees.Tree;
Nonterm : in WisiToken.Syntax_Trees.Valid_Node_Access);
procedure declare_expression_0
(User_Data : in out WisiToken.Syntax_Trees.User_Data_Type'Class;
Tree : in out WisiToken.Syntax_Trees.Tree;
Nonterm : in WisiToken.Syntax_Trees.Valid_Node_Access);
procedure declare_expression_1
(User_Data : in out WisiToken.Syntax_Trees.User_Data_Type'Class;
Tree : in out WisiToken.Syntax_Trees.Tree;
Nonterm : in WisiToken.Syntax_Trees.Valid_Node_Access);
procedure reduction_specification_0
(User_Data : in out WisiToken.Syntax_Trees.User_Data_Type'Class;
Tree : in out WisiToken.Syntax_Trees.Tree;
Nonterm : in WisiToken.Syntax_Trees.Valid_Node_Access);
procedure qualified_expression_0
(User_Data : in out WisiToken.Syntax_Trees.User_Data_Type'Class;
Tree : in out WisiToken.Syntax_Trees.Tree;
Nonterm : in WisiToken.Syntax_Trees.Valid_Node_Access);
procedure subtype_indication_paren_constraint_2
(User_Data : in out WisiToken.Syntax_Trees.User_Data_Type'Class;
Tree : in out WisiToken.Syntax_Trees.Tree;
Nonterm : in WisiToken.Syntax_Trees.Valid_Node_Access);
procedure subtype_indication_paren_constraint_3
(User_Data : in out WisiToken.Syntax_Trees.User_Data_Type'Class;
Tree : in out WisiToken.Syntax_Trees.Tree;
Nonterm : in WisiToken.Syntax_Trees.Valid_Node_Access);
procedure null_statement_0
(User_Data : in out WisiToken.Syntax_Trees.User_Data_Type'Class;
Tree : in out WisiToken.Syntax_Trees.Tree;
Nonterm : in WisiToken.Syntax_Trees.Valid_Node_Access);
procedure label_0
(User_Data : in out WisiToken.Syntax_Trees.User_Data_Type'Class;
Tree : in out WisiToken.Syntax_Trees.Tree;
Nonterm : in WisiToken.Syntax_Trees.Valid_Node_Access);
procedure assignment_statement_0
(User_Data : in out WisiToken.Syntax_Trees.User_Data_Type'Class;
Tree : in out WisiToken.Syntax_Trees.Tree;
Nonterm : in WisiToken.Syntax_Trees.Valid_Node_Access);
procedure elsif_statement_item_0
(User_Data : in out WisiToken.Syntax_Trees.User_Data_Type'Class;
Tree : in out WisiToken.Syntax_Trees.Tree;
Nonterm : in WisiToken.Syntax_Trees.Valid_Node_Access);
procedure if_statement_0
(User_Data : in out WisiToken.Syntax_Trees.User_Data_Type'Class;
Tree : in out WisiToken.Syntax_Trees.Tree;
Nonterm : in WisiToken.Syntax_Trees.Valid_Node_Access);
procedure if_statement_1
(User_Data : in out WisiToken.Syntax_Trees.User_Data_Type'Class;
Tree : in out WisiToken.Syntax_Trees.Tree;
Nonterm : in WisiToken.Syntax_Trees.Valid_Node_Access);
procedure if_statement_2
(User_Data : in out WisiToken.Syntax_Trees.User_Data_Type'Class;
Tree : in out WisiToken.Syntax_Trees.Tree;
Nonterm : in WisiToken.Syntax_Trees.Valid_Node_Access);
procedure if_statement_3
(User_Data : in out WisiToken.Syntax_Trees.User_Data_Type'Class;
Tree : in out WisiToken.Syntax_Trees.Tree;
Nonterm : in WisiToken.Syntax_Trees.Valid_Node_Access);
procedure case_statement_0
(User_Data : in out WisiToken.Syntax_Trees.User_Data_Type'Class;
Tree : in out WisiToken.Syntax_Trees.Tree;
Nonterm : in WisiToken.Syntax_Trees.Valid_Node_Access);
procedure case_statement_alternative_0
(User_Data : in out WisiToken.Syntax_Trees.User_Data_Type'Class;
Tree : in out WisiToken.Syntax_Trees.Tree;
Nonterm : in WisiToken.Syntax_Trees.Valid_Node_Access);
procedure loop_statement_0
(User_Data : in out WisiToken.Syntax_Trees.User_Data_Type'Class;
Tree : in out WisiToken.Syntax_Trees.Tree;
Nonterm : in WisiToken.Syntax_Trees.Valid_Node_Access);
procedure loop_statement_1
(User_Data : in out WisiToken.Syntax_Trees.User_Data_Type'Class;
Tree : in out WisiToken.Syntax_Trees.Tree;
Nonterm : in WisiToken.Syntax_Trees.Valid_Node_Access);
procedure iteration_scheme_0
(User_Data : in out WisiToken.Syntax_Trees.User_Data_Type'Class;
Tree : in out WisiToken.Syntax_Trees.Tree;
Nonterm : in WisiToken.Syntax_Trees.Valid_Node_Access);
procedure iteration_scheme_1
(User_Data : in out WisiToken.Syntax_Trees.User_Data_Type'Class;
Tree : in out WisiToken.Syntax_Trees.Tree;
Nonterm : in WisiToken.Syntax_Trees.Valid_Node_Access);
procedure iteration_scheme_2
(User_Data : in out WisiToken.Syntax_Trees.User_Data_Type'Class;
Tree : in out WisiToken.Syntax_Trees.Tree;
Nonterm : in WisiToken.Syntax_Trees.Valid_Node_Access);
procedure iteration_scheme_3
(User_Data : in out WisiToken.Syntax_Trees.User_Data_Type'Class;
Tree : in out WisiToken.Syntax_Trees.Tree;
Nonterm : in WisiToken.Syntax_Trees.Valid_Node_Access);
procedure iteration_scheme_4
(User_Data : in out WisiToken.Syntax_Trees.User_Data_Type'Class;
Tree : in out WisiToken.Syntax_Trees.Tree;
Nonterm : in WisiToken.Syntax_Trees.Valid_Node_Access);
procedure iteration_scheme_5
(User_Data : in out WisiToken.Syntax_Trees.User_Data_Type'Class;
Tree : in out WisiToken.Syntax_Trees.Tree;
Nonterm : in WisiToken.Syntax_Trees.Valid_Node_Access);
procedure iteration_scheme_6
(User_Data : in out WisiToken.Syntax_Trees.User_Data_Type'Class;
Tree : in out WisiToken.Syntax_Trees.Tree;
Nonterm : in WisiToken.Syntax_Trees.Valid_Node_Access);
procedure iteration_scheme_7
(User_Data : in out WisiToken.Syntax_Trees.User_Data_Type'Class;
Tree : in out WisiToken.Syntax_Trees.Tree;
Nonterm : in WisiToken.Syntax_Trees.Valid_Node_Access);
procedure iteration_scheme_8
(User_Data : in out WisiToken.Syntax_Trees.User_Data_Type'Class;
Tree : in out WisiToken.Syntax_Trees.Tree;
Nonterm : in WisiToken.Syntax_Trees.Valid_Node_Access);
procedure chunk_specification_0
(User_Data : in out WisiToken.Syntax_Trees.User_Data_Type'Class;
Tree : in out WisiToken.Syntax_Trees.Tree;
Nonterm : in WisiToken.Syntax_Trees.Valid_Node_Access);
procedure chunk_specification_1
(User_Data : in out WisiToken.Syntax_Trees.User_Data_Type'Class;
Tree : in out WisiToken.Syntax_Trees.Tree;
Nonterm : in WisiToken.Syntax_Trees.Valid_Node_Access);
procedure block_statement_0
(User_Data : in out WisiToken.Syntax_Trees.User_Data_Type'Class;
Tree : in out WisiToken.Syntax_Trees.Tree;
Nonterm : in WisiToken.Syntax_Trees.Valid_Node_Access);
procedure block_statement_1
(User_Data : in out WisiToken.Syntax_Trees.User_Data_Type'Class;
Tree : in out WisiToken.Syntax_Trees.Tree;
Nonterm : in WisiToken.Syntax_Trees.Valid_Node_Access);
procedure statement_AND_list_1
(User_Data : in out WisiToken.Syntax_Trees.User_Data_Type'Class;
Tree : in out WisiToken.Syntax_Trees.Tree;
Nonterm : in WisiToken.Syntax_Trees.Valid_Node_Access);
procedure parallel_block_statement_0
(User_Data : in out WisiToken.Syntax_Trees.User_Data_Type'Class;
Tree : in out WisiToken.Syntax_Trees.Tree;
Nonterm : in WisiToken.Syntax_Trees.Valid_Node_Access);
procedure exit_statement_0
(User_Data : in out WisiToken.Syntax_Trees.User_Data_Type'Class;
Tree : in out WisiToken.Syntax_Trees.Tree;
Nonterm : in WisiToken.Syntax_Trees.Valid_Node_Access);
procedure exit_statement_1
(User_Data : in out WisiToken.Syntax_Trees.User_Data_Type'Class;
Tree : in out WisiToken.Syntax_Trees.Tree;
Nonterm : in WisiToken.Syntax_Trees.Valid_Node_Access);
procedure exit_statement_2
(User_Data : in out WisiToken.Syntax_Trees.User_Data_Type'Class;
Tree : in out WisiToken.Syntax_Trees.Tree;
Nonterm : in WisiToken.Syntax_Trees.Valid_Node_Access);
procedure exit_statement_3
(User_Data : in out WisiToken.Syntax_Trees.User_Data_Type'Class;
Tree : in out WisiToken.Syntax_Trees.Tree;
Nonterm : in WisiToken.Syntax_Trees.Valid_Node_Access);
procedure goto_statement_0
(User_Data : in out WisiToken.Syntax_Trees.User_Data_Type'Class;
Tree : in out WisiToken.Syntax_Trees.Tree;
Nonterm : in WisiToken.Syntax_Trees.Valid_Node_Access);
procedure subprogram_declaration_0
(User_Data : in out WisiToken.Syntax_Trees.User_Data_Type'Class;
Tree : in out WisiToken.Syntax_Trees.Tree;
Nonterm : in WisiToken.Syntax_Trees.Valid_Node_Access);
procedure subprogram_declaration_1
(User_Data : in out WisiToken.Syntax_Trees.User_Data_Type'Class;
Tree : in out WisiToken.Syntax_Trees.Tree;
Nonterm : in WisiToken.Syntax_Trees.Valid_Node_Access);
procedure subprogram_declaration_2
(User_Data : in out WisiToken.Syntax_Trees.User_Data_Type'Class;
Tree : in out WisiToken.Syntax_Trees.Tree;
Nonterm : in WisiToken.Syntax_Trees.Valid_Node_Access);
procedure subprogram_declaration_3
(User_Data : in out WisiToken.Syntax_Trees.User_Data_Type'Class;
Tree : in out WisiToken.Syntax_Trees.Tree;
Nonterm : in WisiToken.Syntax_Trees.Valid_Node_Access);
procedure procedure_specification_0
(User_Data : in out WisiToken.Syntax_Trees.User_Data_Type'Class;
Tree : in out WisiToken.Syntax_Trees.Tree;
Nonterm : in WisiToken.Syntax_Trees.Valid_Node_Access);
procedure function_specification_0
(User_Data : in out WisiToken.Syntax_Trees.User_Data_Type'Class;
Tree : in out WisiToken.Syntax_Trees.Tree;
Nonterm : in WisiToken.Syntax_Trees.Valid_Node_Access);
procedure result_profile_0
(User_Data : in out WisiToken.Syntax_Trees.User_Data_Type'Class;
Tree : in out WisiToken.Syntax_Trees.Tree;
Nonterm : in WisiToken.Syntax_Trees.Valid_Node_Access);
procedure result_profile_1
(User_Data : in out WisiToken.Syntax_Trees.User_Data_Type'Class;
Tree : in out WisiToken.Syntax_Trees.Tree;
Nonterm : in WisiToken.Syntax_Trees.Valid_Node_Access);
procedure result_profile_2
(User_Data : in out WisiToken.Syntax_Trees.User_Data_Type'Class;
Tree : in out WisiToken.Syntax_Trees.Tree;
Nonterm : in WisiToken.Syntax_Trees.Valid_Node_Access);
procedure parameter_and_result_profile_0
(User_Data : in out WisiToken.Syntax_Trees.User_Data_Type'Class;
Tree : in out WisiToken.Syntax_Trees.Tree;
Nonterm : in WisiToken.Syntax_Trees.Valid_Node_Access);
procedure formal_part_0
(User_Data : in out WisiToken.Syntax_Trees.User_Data_Type'Class;
Tree : in out WisiToken.Syntax_Trees.Tree;
Nonterm : in WisiToken.Syntax_Trees.Valid_Node_Access);
procedure parameter_specification_0
(User_Data : in out WisiToken.Syntax_Trees.User_Data_Type'Class;
Tree : in out WisiToken.Syntax_Trees.Tree;
Nonterm : in WisiToken.Syntax_Trees.Valid_Node_Access);
procedure parameter_specification_1
(User_Data : in out WisiToken.Syntax_Trees.User_Data_Type'Class;
Tree : in out WisiToken.Syntax_Trees.Tree;
Nonterm : in WisiToken.Syntax_Trees.Valid_Node_Access);
procedure parameter_specification_2
(User_Data : in out WisiToken.Syntax_Trees.User_Data_Type'Class;
Tree : in out WisiToken.Syntax_Trees.Tree;
Nonterm : in WisiToken.Syntax_Trees.Valid_Node_Access);
procedure parameter_specification_3
(User_Data : in out WisiToken.Syntax_Trees.User_Data_Type'Class;
Tree : in out WisiToken.Syntax_Trees.Tree;
Nonterm : in WisiToken.Syntax_Trees.Valid_Node_Access);
procedure parameter_specification_4
(User_Data : in out WisiToken.Syntax_Trees.User_Data_Type'Class;
Tree : in out WisiToken.Syntax_Trees.Tree;
Nonterm : in WisiToken.Syntax_Trees.Valid_Node_Access);
procedure parameter_specification_5
(User_Data : in out WisiToken.Syntax_Trees.User_Data_Type'Class;
Tree : in out WisiToken.Syntax_Trees.Tree;
Nonterm : in WisiToken.Syntax_Trees.Valid_Node_Access);
procedure parameter_specification_6
(User_Data : in out WisiToken.Syntax_Trees.User_Data_Type'Class;
Tree : in out WisiToken.Syntax_Trees.Tree;
Nonterm : in WisiToken.Syntax_Trees.Valid_Node_Access);
procedure parameter_specification_7
(User_Data : in out WisiToken.Syntax_Trees.User_Data_Type'Class;
Tree : in out WisiToken.Syntax_Trees.Tree;
Nonterm : in WisiToken.Syntax_Trees.Valid_Node_Access);
procedure parameter_specification_8
(User_Data : in out WisiToken.Syntax_Trees.User_Data_Type'Class;
Tree : in out WisiToken.Syntax_Trees.Tree;
Nonterm : in WisiToken.Syntax_Trees.Valid_Node_Access);
procedure parameter_specification_9
(User_Data : in out WisiToken.Syntax_Trees.User_Data_Type'Class;
Tree : in out WisiToken.Syntax_Trees.Tree;
Nonterm : in WisiToken.Syntax_Trees.Valid_Node_Access);
procedure subprogram_body_0
(User_Data : in out WisiToken.Syntax_Trees.User_Data_Type'Class;
Tree : in out WisiToken.Syntax_Trees.Tree;
Nonterm : in WisiToken.Syntax_Trees.Valid_Node_Access);
procedure subprogram_body_1
(User_Data : in out WisiToken.Syntax_Trees.User_Data_Type'Class;
Tree : in out WisiToken.Syntax_Trees.Tree;
Nonterm : in WisiToken.Syntax_Trees.Valid_Node_Access);
procedure subprogram_body_2
(User_Data : in out WisiToken.Syntax_Trees.User_Data_Type'Class;
Tree : in out WisiToken.Syntax_Trees.Tree;
Nonterm : in WisiToken.Syntax_Trees.Valid_Node_Access);
procedure subprogram_body_3
(User_Data : in out WisiToken.Syntax_Trees.User_Data_Type'Class;
Tree : in out WisiToken.Syntax_Trees.Tree;
Nonterm : in WisiToken.Syntax_Trees.Valid_Node_Access);
procedure procedure_call_statement_0
(User_Data : in out WisiToken.Syntax_Trees.User_Data_Type'Class;
Tree : in out WisiToken.Syntax_Trees.Tree;
Nonterm : in WisiToken.Syntax_Trees.Valid_Node_Access);
procedure function_call_0
(User_Data : in out WisiToken.Syntax_Trees.User_Data_Type'Class;
Tree : in out WisiToken.Syntax_Trees.Tree;
Nonterm : in WisiToken.Syntax_Trees.Valid_Node_Access);
procedure actual_parameter_part_0
(User_Data : in out WisiToken.Syntax_Trees.User_Data_Type'Class;
Tree : in out WisiToken.Syntax_Trees.Tree;
Nonterm : in WisiToken.Syntax_Trees.Valid_Node_Access);
procedure actual_parameter_part_1
(User_Data : in out WisiToken.Syntax_Trees.User_Data_Type'Class;
Tree : in out WisiToken.Syntax_Trees.Tree;
Nonterm : in WisiToken.Syntax_Trees.Valid_Node_Access);
procedure actual_parameter_part_2
(User_Data : in out WisiToken.Syntax_Trees.User_Data_Type'Class;
Tree : in out WisiToken.Syntax_Trees.Tree;
Nonterm : in WisiToken.Syntax_Trees.Valid_Node_Access);
procedure actual_parameter_part_3
(User_Data : in out WisiToken.Syntax_Trees.User_Data_Type'Class;
Tree : in out WisiToken.Syntax_Trees.Tree;
Nonterm : in WisiToken.Syntax_Trees.Valid_Node_Access);
procedure assoc_expression_0
(User_Data : in out WisiToken.Syntax_Trees.User_Data_Type'Class;
Tree : in out WisiToken.Syntax_Trees.Tree;
Nonterm : in WisiToken.Syntax_Trees.Valid_Node_Access);
procedure parameter_association_0
(User_Data : in out WisiToken.Syntax_Trees.User_Data_Type'Class;
Tree : in out WisiToken.Syntax_Trees.Tree;
Nonterm : in WisiToken.Syntax_Trees.Valid_Node_Access);
procedure parameter_association_1
(User_Data : in out WisiToken.Syntax_Trees.User_Data_Type'Class;
Tree : in out WisiToken.Syntax_Trees.Tree;
Nonterm : in WisiToken.Syntax_Trees.Valid_Node_Access);
procedure simple_return_statement_0
(User_Data : in out WisiToken.Syntax_Trees.User_Data_Type'Class;
Tree : in out WisiToken.Syntax_Trees.Tree;
Nonterm : in WisiToken.Syntax_Trees.Valid_Node_Access);
procedure simple_return_statement_1
(User_Data : in out WisiToken.Syntax_Trees.User_Data_Type'Class;
Tree : in out WisiToken.Syntax_Trees.Tree;
Nonterm : in WisiToken.Syntax_Trees.Valid_Node_Access);
procedure extended_return_object_declaration_0
(User_Data : in out WisiToken.Syntax_Trees.User_Data_Type'Class;
Tree : in out WisiToken.Syntax_Trees.Tree;
Nonterm : in WisiToken.Syntax_Trees.Valid_Node_Access);
procedure extended_return_object_declaration_1
(User_Data : in out WisiToken.Syntax_Trees.User_Data_Type'Class;
Tree : in out WisiToken.Syntax_Trees.Tree;
Nonterm : in WisiToken.Syntax_Trees.Valid_Node_Access);
procedure extended_return_object_declaration_2
(User_Data : in out WisiToken.Syntax_Trees.User_Data_Type'Class;
Tree : in out WisiToken.Syntax_Trees.Tree;
Nonterm : in WisiToken.Syntax_Trees.Valid_Node_Access);
procedure extended_return_object_declaration_3
(User_Data : in out WisiToken.Syntax_Trees.User_Data_Type'Class;
Tree : in out WisiToken.Syntax_Trees.Tree;
Nonterm : in WisiToken.Syntax_Trees.Valid_Node_Access);
procedure extended_return_object_declaration_4
(User_Data : in out WisiToken.Syntax_Trees.User_Data_Type'Class;
Tree : in out WisiToken.Syntax_Trees.Tree;
Nonterm : in WisiToken.Syntax_Trees.Valid_Node_Access);
procedure extended_return_object_declaration_5
(User_Data : in out WisiToken.Syntax_Trees.User_Data_Type'Class;
Tree : in out WisiToken.Syntax_Trees.Tree;
Nonterm : in WisiToken.Syntax_Trees.Valid_Node_Access);
procedure extended_return_object_declaration_6
(User_Data : in out WisiToken.Syntax_Trees.User_Data_Type'Class;
Tree : in out WisiToken.Syntax_Trees.Tree;
Nonterm : in WisiToken.Syntax_Trees.Valid_Node_Access);
procedure extended_return_object_declaration_7
(User_Data : in out WisiToken.Syntax_Trees.User_Data_Type'Class;
Tree : in out WisiToken.Syntax_Trees.Tree;
Nonterm : in WisiToken.Syntax_Trees.Valid_Node_Access);
procedure extended_return_statement_0
(User_Data : in out WisiToken.Syntax_Trees.User_Data_Type'Class;
Tree : in out WisiToken.Syntax_Trees.Tree;
Nonterm : in WisiToken.Syntax_Trees.Valid_Node_Access);
procedure extended_return_statement_1
(User_Data : in out WisiToken.Syntax_Trees.User_Data_Type'Class;
Tree : in out WisiToken.Syntax_Trees.Tree;
Nonterm : in WisiToken.Syntax_Trees.Valid_Node_Access);
procedure null_procedure_declaration_0
(User_Data : in out WisiToken.Syntax_Trees.User_Data_Type'Class;
Tree : in out WisiToken.Syntax_Trees.Tree;
Nonterm : in WisiToken.Syntax_Trees.Valid_Node_Access);
procedure null_procedure_declaration_1
(User_Data : in out WisiToken.Syntax_Trees.User_Data_Type'Class;
Tree : in out WisiToken.Syntax_Trees.Tree;
Nonterm : in WisiToken.Syntax_Trees.Valid_Node_Access);
procedure null_procedure_declaration_2
(User_Data : in out WisiToken.Syntax_Trees.User_Data_Type'Class;
Tree : in out WisiToken.Syntax_Trees.Tree;
Nonterm : in WisiToken.Syntax_Trees.Valid_Node_Access);
procedure null_procedure_declaration_3
(User_Data : in out WisiToken.Syntax_Trees.User_Data_Type'Class;
Tree : in out WisiToken.Syntax_Trees.Tree;
Nonterm : in WisiToken.Syntax_Trees.Valid_Node_Access);
procedure expression_function_declaration_0
(User_Data : in out WisiToken.Syntax_Trees.User_Data_Type'Class;
Tree : in out WisiToken.Syntax_Trees.Tree;
Nonterm : in WisiToken.Syntax_Trees.Valid_Node_Access);
procedure expression_function_declaration_1
(User_Data : in out WisiToken.Syntax_Trees.User_Data_Type'Class;
Tree : in out WisiToken.Syntax_Trees.Tree;
Nonterm : in WisiToken.Syntax_Trees.Valid_Node_Access);
procedure expression_function_declaration_2
(User_Data : in out WisiToken.Syntax_Trees.User_Data_Type'Class;
Tree : in out WisiToken.Syntax_Trees.Tree;
Nonterm : in WisiToken.Syntax_Trees.Valid_Node_Access);
procedure expression_function_declaration_3
(User_Data : in out WisiToken.Syntax_Trees.User_Data_Type'Class;
Tree : in out WisiToken.Syntax_Trees.Tree;
Nonterm : in WisiToken.Syntax_Trees.Valid_Node_Access);
procedure package_declaration_0
(User_Data : in out WisiToken.Syntax_Trees.User_Data_Type'Class;
Tree : in out WisiToken.Syntax_Trees.Tree;
Nonterm : in WisiToken.Syntax_Trees.Valid_Node_Access);
procedure package_specification_0
(User_Data : in out WisiToken.Syntax_Trees.User_Data_Type'Class;
Tree : in out WisiToken.Syntax_Trees.Tree;
Nonterm : in WisiToken.Syntax_Trees.Valid_Node_Access);
procedure package_specification_1
(User_Data : in out WisiToken.Syntax_Trees.User_Data_Type'Class;
Tree : in out WisiToken.Syntax_Trees.Tree;
Nonterm : in WisiToken.Syntax_Trees.Valid_Node_Access);
procedure package_specification_2
(User_Data : in out WisiToken.Syntax_Trees.User_Data_Type'Class;
Tree : in out WisiToken.Syntax_Trees.Tree;
Nonterm : in WisiToken.Syntax_Trees.Valid_Node_Access);
procedure package_specification_3
(User_Data : in out WisiToken.Syntax_Trees.User_Data_Type'Class;
Tree : in out WisiToken.Syntax_Trees.Tree;
Nonterm : in WisiToken.Syntax_Trees.Valid_Node_Access);
procedure package_specification_4
(User_Data : in out WisiToken.Syntax_Trees.User_Data_Type'Class;
Tree : in out WisiToken.Syntax_Trees.Tree;
Nonterm : in WisiToken.Syntax_Trees.Valid_Node_Access);
procedure package_specification_5
(User_Data : in out WisiToken.Syntax_Trees.User_Data_Type'Class;
Tree : in out WisiToken.Syntax_Trees.Tree;
Nonterm : in WisiToken.Syntax_Trees.Valid_Node_Access);
procedure package_specification_6
(User_Data : in out WisiToken.Syntax_Trees.User_Data_Type'Class;
Tree : in out WisiToken.Syntax_Trees.Tree;
Nonterm : in WisiToken.Syntax_Trees.Valid_Node_Access);
procedure package_specification_7
(User_Data : in out WisiToken.Syntax_Trees.User_Data_Type'Class;
Tree : in out WisiToken.Syntax_Trees.Tree;
Nonterm : in WisiToken.Syntax_Trees.Valid_Node_Access);
procedure package_specification_8
(User_Data : in out WisiToken.Syntax_Trees.User_Data_Type'Class;
Tree : in out WisiToken.Syntax_Trees.Tree;
Nonterm : in WisiToken.Syntax_Trees.Valid_Node_Access);
procedure package_specification_9
(User_Data : in out WisiToken.Syntax_Trees.User_Data_Type'Class;
Tree : in out WisiToken.Syntax_Trees.Tree;
Nonterm : in WisiToken.Syntax_Trees.Valid_Node_Access);
procedure package_specification_10
(User_Data : in out WisiToken.Syntax_Trees.User_Data_Type'Class;
Tree : in out WisiToken.Syntax_Trees.Tree;
Nonterm : in WisiToken.Syntax_Trees.Valid_Node_Access);
procedure package_specification_11
(User_Data : in out WisiToken.Syntax_Trees.User_Data_Type'Class;
Tree : in out WisiToken.Syntax_Trees.Tree;
Nonterm : in WisiToken.Syntax_Trees.Valid_Node_Access);
procedure package_body_0
(User_Data : in out WisiToken.Syntax_Trees.User_Data_Type'Class;
Tree : in out WisiToken.Syntax_Trees.Tree;
Nonterm : in WisiToken.Syntax_Trees.Valid_Node_Access);
procedure package_body_1
(User_Data : in out WisiToken.Syntax_Trees.User_Data_Type'Class;
Tree : in out WisiToken.Syntax_Trees.Tree;
Nonterm : in WisiToken.Syntax_Trees.Valid_Node_Access);
procedure package_body_2
(User_Data : in out WisiToken.Syntax_Trees.User_Data_Type'Class;
Tree : in out WisiToken.Syntax_Trees.Tree;
Nonterm : in WisiToken.Syntax_Trees.Valid_Node_Access);
procedure package_body_3
(User_Data : in out WisiToken.Syntax_Trees.User_Data_Type'Class;
Tree : in out WisiToken.Syntax_Trees.Tree;
Nonterm : in WisiToken.Syntax_Trees.Valid_Node_Access);
procedure private_type_declaration_0
(User_Data : in out WisiToken.Syntax_Trees.User_Data_Type'Class;
Tree : in out WisiToken.Syntax_Trees.Tree;
Nonterm : in WisiToken.Syntax_Trees.Valid_Node_Access);
procedure private_type_declaration_1
(User_Data : in out WisiToken.Syntax_Trees.User_Data_Type'Class;
Tree : in out WisiToken.Syntax_Trees.Tree;
Nonterm : in WisiToken.Syntax_Trees.Valid_Node_Access);
procedure private_type_declaration_2
(User_Data : in out WisiToken.Syntax_Trees.User_Data_Type'Class;
Tree : in out WisiToken.Syntax_Trees.Tree;
Nonterm : in WisiToken.Syntax_Trees.Valid_Node_Access);
procedure private_type_declaration_3
(User_Data : in out WisiToken.Syntax_Trees.User_Data_Type'Class;
Tree : in out WisiToken.Syntax_Trees.Tree;
Nonterm : in WisiToken.Syntax_Trees.Valid_Node_Access);
procedure private_type_declaration_4
(User_Data : in out WisiToken.Syntax_Trees.User_Data_Type'Class;
Tree : in out WisiToken.Syntax_Trees.Tree;
Nonterm : in WisiToken.Syntax_Trees.Valid_Node_Access);
procedure private_type_declaration_5
(User_Data : in out WisiToken.Syntax_Trees.User_Data_Type'Class;
Tree : in out WisiToken.Syntax_Trees.Tree;
Nonterm : in WisiToken.Syntax_Trees.Valid_Node_Access);
procedure private_type_declaration_6
(User_Data : in out WisiToken.Syntax_Trees.User_Data_Type'Class;
Tree : in out WisiToken.Syntax_Trees.Tree;
Nonterm : in WisiToken.Syntax_Trees.Valid_Node_Access);
procedure private_type_declaration_7
(User_Data : in out WisiToken.Syntax_Trees.User_Data_Type'Class;
Tree : in out WisiToken.Syntax_Trees.Tree;
Nonterm : in WisiToken.Syntax_Trees.Valid_Node_Access);
procedure private_type_declaration_8
(User_Data : in out WisiToken.Syntax_Trees.User_Data_Type'Class;
Tree : in out WisiToken.Syntax_Trees.Tree;
Nonterm : in WisiToken.Syntax_Trees.Valid_Node_Access);
procedure private_type_declaration_9
(User_Data : in out WisiToken.Syntax_Trees.User_Data_Type'Class;
Tree : in out WisiToken.Syntax_Trees.Tree;
Nonterm : in WisiToken.Syntax_Trees.Valid_Node_Access);
procedure private_type_declaration_10
(User_Data : in out WisiToken.Syntax_Trees.User_Data_Type'Class;
Tree : in out WisiToken.Syntax_Trees.Tree;
Nonterm : in WisiToken.Syntax_Trees.Valid_Node_Access);
procedure private_type_declaration_11
(User_Data : in out WisiToken.Syntax_Trees.User_Data_Type'Class;
Tree : in out WisiToken.Syntax_Trees.Tree;
Nonterm : in WisiToken.Syntax_Trees.Valid_Node_Access);
procedure private_type_declaration_12
(User_Data : in out WisiToken.Syntax_Trees.User_Data_Type'Class;
Tree : in out WisiToken.Syntax_Trees.Tree;
Nonterm : in WisiToken.Syntax_Trees.Valid_Node_Access);
procedure private_type_declaration_13
(User_Data : in out WisiToken.Syntax_Trees.User_Data_Type'Class;
Tree : in out WisiToken.Syntax_Trees.Tree;
Nonterm : in WisiToken.Syntax_Trees.Valid_Node_Access);
procedure private_type_declaration_14
(User_Data : in out WisiToken.Syntax_Trees.User_Data_Type'Class;
Tree : in out WisiToken.Syntax_Trees.Tree;
Nonterm : in WisiToken.Syntax_Trees.Valid_Node_Access);
procedure private_type_declaration_15
(User_Data : in out WisiToken.Syntax_Trees.User_Data_Type'Class;
Tree : in out WisiToken.Syntax_Trees.Tree;
Nonterm : in WisiToken.Syntax_Trees.Valid_Node_Access);
procedure private_type_declaration_16
(User_Data : in out WisiToken.Syntax_Trees.User_Data_Type'Class;
Tree : in out WisiToken.Syntax_Trees.Tree;
Nonterm : in WisiToken.Syntax_Trees.Valid_Node_Access);
procedure private_type_declaration_17
(User_Data : in out WisiToken.Syntax_Trees.User_Data_Type'Class;
Tree : in out WisiToken.Syntax_Trees.Tree;
Nonterm : in WisiToken.Syntax_Trees.Valid_Node_Access);
procedure private_type_declaration_18
(User_Data : in out WisiToken.Syntax_Trees.User_Data_Type'Class;
Tree : in out WisiToken.Syntax_Trees.Tree;
Nonterm : in WisiToken.Syntax_Trees.Valid_Node_Access);
procedure private_type_declaration_19
(User_Data : in out WisiToken.Syntax_Trees.User_Data_Type'Class;
Tree : in out WisiToken.Syntax_Trees.Tree;
Nonterm : in WisiToken.Syntax_Trees.Valid_Node_Access);
procedure private_type_declaration_20
(User_Data : in out WisiToken.Syntax_Trees.User_Data_Type'Class;
Tree : in out WisiToken.Syntax_Trees.Tree;
Nonterm : in WisiToken.Syntax_Trees.Valid_Node_Access);
procedure private_type_declaration_21
(User_Data : in out WisiToken.Syntax_Trees.User_Data_Type'Class;
Tree : in out WisiToken.Syntax_Trees.Tree;
Nonterm : in WisiToken.Syntax_Trees.Valid_Node_Access);
procedure private_type_declaration_22
(User_Data : in out WisiToken.Syntax_Trees.User_Data_Type'Class;
Tree : in out WisiToken.Syntax_Trees.Tree;
Nonterm : in WisiToken.Syntax_Trees.Valid_Node_Access);
procedure private_type_declaration_23
(User_Data : in out WisiToken.Syntax_Trees.User_Data_Type'Class;
Tree : in out WisiToken.Syntax_Trees.Tree;
Nonterm : in WisiToken.Syntax_Trees.Valid_Node_Access);
procedure private_extension_declaration_0
(User_Data : in out WisiToken.Syntax_Trees.User_Data_Type'Class;
Tree : in out WisiToken.Syntax_Trees.Tree;
Nonterm : in WisiToken.Syntax_Trees.Valid_Node_Access);
procedure private_extension_declaration_1
(User_Data : in out WisiToken.Syntax_Trees.User_Data_Type'Class;
Tree : in out WisiToken.Syntax_Trees.Tree;
Nonterm : in WisiToken.Syntax_Trees.Valid_Node_Access);
procedure private_extension_declaration_2
(User_Data : in out WisiToken.Syntax_Trees.User_Data_Type'Class;
Tree : in out WisiToken.Syntax_Trees.Tree;
Nonterm : in WisiToken.Syntax_Trees.Valid_Node_Access);
procedure private_extension_declaration_3
(User_Data : in out WisiToken.Syntax_Trees.User_Data_Type'Class;
Tree : in out WisiToken.Syntax_Trees.Tree;
Nonterm : in WisiToken.Syntax_Trees.Valid_Node_Access);
procedure private_extension_declaration_4
(User_Data : in out WisiToken.Syntax_Trees.User_Data_Type'Class;
Tree : in out WisiToken.Syntax_Trees.Tree;
Nonterm : in WisiToken.Syntax_Trees.Valid_Node_Access);
procedure private_extension_declaration_5
(User_Data : in out WisiToken.Syntax_Trees.User_Data_Type'Class;
Tree : in out WisiToken.Syntax_Trees.Tree;
Nonterm : in WisiToken.Syntax_Trees.Valid_Node_Access);
procedure private_extension_declaration_6
(User_Data : in out WisiToken.Syntax_Trees.User_Data_Type'Class;
Tree : in out WisiToken.Syntax_Trees.Tree;
Nonterm : in WisiToken.Syntax_Trees.Valid_Node_Access);
procedure private_extension_declaration_7
(User_Data : in out WisiToken.Syntax_Trees.User_Data_Type'Class;
Tree : in out WisiToken.Syntax_Trees.Tree;
Nonterm : in WisiToken.Syntax_Trees.Valid_Node_Access);
procedure private_extension_declaration_8
(User_Data : in out WisiToken.Syntax_Trees.User_Data_Type'Class;
Tree : in out WisiToken.Syntax_Trees.Tree;
Nonterm : in WisiToken.Syntax_Trees.Valid_Node_Access);
procedure private_extension_declaration_9
(User_Data : in out WisiToken.Syntax_Trees.User_Data_Type'Class;
Tree : in out WisiToken.Syntax_Trees.Tree;
Nonterm : in WisiToken.Syntax_Trees.Valid_Node_Access);
procedure private_extension_declaration_10
(User_Data : in out WisiToken.Syntax_Trees.User_Data_Type'Class;
Tree : in out WisiToken.Syntax_Trees.Tree;
Nonterm : in WisiToken.Syntax_Trees.Valid_Node_Access);
procedure private_extension_declaration_11
(User_Data : in out WisiToken.Syntax_Trees.User_Data_Type'Class;
Tree : in out WisiToken.Syntax_Trees.Tree;
Nonterm : in WisiToken.Syntax_Trees.Valid_Node_Access);
procedure private_extension_declaration_12
(User_Data : in out WisiToken.Syntax_Trees.User_Data_Type'Class;
Tree : in out WisiToken.Syntax_Trees.Tree;
Nonterm : in WisiToken.Syntax_Trees.Valid_Node_Access);
procedure private_extension_declaration_13
(User_Data : in out WisiToken.Syntax_Trees.User_Data_Type'Class;
Tree : in out WisiToken.Syntax_Trees.Tree;
Nonterm : in WisiToken.Syntax_Trees.Valid_Node_Access);
procedure private_extension_declaration_14
(User_Data : in out WisiToken.Syntax_Trees.User_Data_Type'Class;
Tree : in out WisiToken.Syntax_Trees.Tree;
Nonterm : in WisiToken.Syntax_Trees.Valid_Node_Access);
procedure private_extension_declaration_15
(User_Data : in out WisiToken.Syntax_Trees.User_Data_Type'Class;
Tree : in out WisiToken.Syntax_Trees.Tree;
Nonterm : in WisiToken.Syntax_Trees.Valid_Node_Access);
procedure private_extension_declaration_16
(User_Data : in out WisiToken.Syntax_Trees.User_Data_Type'Class;
Tree : in out WisiToken.Syntax_Trees.Tree;
Nonterm : in WisiToken.Syntax_Trees.Valid_Node_Access);
procedure private_extension_declaration_17
(User_Data : in out WisiToken.Syntax_Trees.User_Data_Type'Class;
Tree : in out WisiToken.Syntax_Trees.Tree;
Nonterm : in WisiToken.Syntax_Trees.Valid_Node_Access);
procedure private_extension_declaration_18
(User_Data : in out WisiToken.Syntax_Trees.User_Data_Type'Class;
Tree : in out WisiToken.Syntax_Trees.Tree;
Nonterm : in WisiToken.Syntax_Trees.Valid_Node_Access);
procedure private_extension_declaration_19
(User_Data : in out WisiToken.Syntax_Trees.User_Data_Type'Class;
Tree : in out WisiToken.Syntax_Trees.Tree;
Nonterm : in WisiToken.Syntax_Trees.Valid_Node_Access);
procedure private_extension_declaration_20
(User_Data : in out WisiToken.Syntax_Trees.User_Data_Type'Class;
Tree : in out WisiToken.Syntax_Trees.Tree;
Nonterm : in WisiToken.Syntax_Trees.Valid_Node_Access);
procedure private_extension_declaration_21
(User_Data : in out WisiToken.Syntax_Trees.User_Data_Type'Class;
Tree : in out WisiToken.Syntax_Trees.Tree;
Nonterm : in WisiToken.Syntax_Trees.Valid_Node_Access);
procedure private_extension_declaration_22
(User_Data : in out WisiToken.Syntax_Trees.User_Data_Type'Class;
Tree : in out WisiToken.Syntax_Trees.Tree;
Nonterm : in WisiToken.Syntax_Trees.Valid_Node_Access);
procedure private_extension_declaration_23
(User_Data : in out WisiToken.Syntax_Trees.User_Data_Type'Class;
Tree : in out WisiToken.Syntax_Trees.Tree;
Nonterm : in WisiToken.Syntax_Trees.Valid_Node_Access);
procedure private_extension_declaration_24
(User_Data : in out WisiToken.Syntax_Trees.User_Data_Type'Class;
Tree : in out WisiToken.Syntax_Trees.Tree;
Nonterm : in WisiToken.Syntax_Trees.Valid_Node_Access);
procedure private_extension_declaration_25
(User_Data : in out WisiToken.Syntax_Trees.User_Data_Type'Class;
Tree : in out WisiToken.Syntax_Trees.Tree;
Nonterm : in WisiToken.Syntax_Trees.Valid_Node_Access);
procedure private_extension_declaration_26
(User_Data : in out WisiToken.Syntax_Trees.User_Data_Type'Class;
Tree : in out WisiToken.Syntax_Trees.Tree;
Nonterm : in WisiToken.Syntax_Trees.Valid_Node_Access);
procedure private_extension_declaration_27
(User_Data : in out WisiToken.Syntax_Trees.User_Data_Type'Class;
Tree : in out WisiToken.Syntax_Trees.Tree;
Nonterm : in WisiToken.Syntax_Trees.Valid_Node_Access);
procedure private_extension_declaration_28
(User_Data : in out WisiToken.Syntax_Trees.User_Data_Type'Class;
Tree : in out WisiToken.Syntax_Trees.Tree;
Nonterm : in WisiToken.Syntax_Trees.Valid_Node_Access);
procedure private_extension_declaration_29
(User_Data : in out WisiToken.Syntax_Trees.User_Data_Type'Class;
Tree : in out WisiToken.Syntax_Trees.Tree;
Nonterm : in WisiToken.Syntax_Trees.Valid_Node_Access);
procedure private_extension_declaration_30
(User_Data : in out WisiToken.Syntax_Trees.User_Data_Type'Class;
Tree : in out WisiToken.Syntax_Trees.Tree;
Nonterm : in WisiToken.Syntax_Trees.Valid_Node_Access);
procedure private_extension_declaration_31
(User_Data : in out WisiToken.Syntax_Trees.User_Data_Type'Class;
Tree : in out WisiToken.Syntax_Trees.Tree;
Nonterm : in WisiToken.Syntax_Trees.Valid_Node_Access);
procedure private_extension_declaration_32
(User_Data : in out WisiToken.Syntax_Trees.User_Data_Type'Class;
Tree : in out WisiToken.Syntax_Trees.Tree;
Nonterm : in WisiToken.Syntax_Trees.Valid_Node_Access);
procedure private_extension_declaration_33
(User_Data : in out WisiToken.Syntax_Trees.User_Data_Type'Class;
Tree : in out WisiToken.Syntax_Trees.Tree;
Nonterm : in WisiToken.Syntax_Trees.Valid_Node_Access);
procedure private_extension_declaration_34
(User_Data : in out WisiToken.Syntax_Trees.User_Data_Type'Class;
Tree : in out WisiToken.Syntax_Trees.Tree;
Nonterm : in WisiToken.Syntax_Trees.Valid_Node_Access);
procedure private_extension_declaration_35
(User_Data : in out WisiToken.Syntax_Trees.User_Data_Type'Class;
Tree : in out WisiToken.Syntax_Trees.Tree;
Nonterm : in WisiToken.Syntax_Trees.Valid_Node_Access);
procedure private_extension_declaration_36
(User_Data : in out WisiToken.Syntax_Trees.User_Data_Type'Class;
Tree : in out WisiToken.Syntax_Trees.Tree;
Nonterm : in WisiToken.Syntax_Trees.Valid_Node_Access);
procedure private_extension_declaration_37
(User_Data : in out WisiToken.Syntax_Trees.User_Data_Type'Class;
Tree : in out WisiToken.Syntax_Trees.Tree;
Nonterm : in WisiToken.Syntax_Trees.Valid_Node_Access);
procedure private_extension_declaration_38
(User_Data : in out WisiToken.Syntax_Trees.User_Data_Type'Class;
Tree : in out WisiToken.Syntax_Trees.Tree;
Nonterm : in WisiToken.Syntax_Trees.Valid_Node_Access);
procedure private_extension_declaration_39
(User_Data : in out WisiToken.Syntax_Trees.User_Data_Type'Class;
Tree : in out WisiToken.Syntax_Trees.Tree;
Nonterm : in WisiToken.Syntax_Trees.Valid_Node_Access);
procedure private_extension_declaration_40
(User_Data : in out WisiToken.Syntax_Trees.User_Data_Type'Class;
Tree : in out WisiToken.Syntax_Trees.Tree;
Nonterm : in WisiToken.Syntax_Trees.Valid_Node_Access);
procedure private_extension_declaration_41
(User_Data : in out WisiToken.Syntax_Trees.User_Data_Type'Class;
Tree : in out WisiToken.Syntax_Trees.Tree;
Nonterm : in WisiToken.Syntax_Trees.Valid_Node_Access);
procedure private_extension_declaration_42
(User_Data : in out WisiToken.Syntax_Trees.User_Data_Type'Class;
Tree : in out WisiToken.Syntax_Trees.Tree;
Nonterm : in WisiToken.Syntax_Trees.Valid_Node_Access);
procedure private_extension_declaration_43
(User_Data : in out WisiToken.Syntax_Trees.User_Data_Type'Class;
Tree : in out WisiToken.Syntax_Trees.Tree;
Nonterm : in WisiToken.Syntax_Trees.Valid_Node_Access);
procedure private_extension_declaration_44
(User_Data : in out WisiToken.Syntax_Trees.User_Data_Type'Class;
Tree : in out WisiToken.Syntax_Trees.Tree;
Nonterm : in WisiToken.Syntax_Trees.Valid_Node_Access);
procedure private_extension_declaration_45
(User_Data : in out WisiToken.Syntax_Trees.User_Data_Type'Class;
Tree : in out WisiToken.Syntax_Trees.Tree;
Nonterm : in WisiToken.Syntax_Trees.Valid_Node_Access);
procedure private_extension_declaration_46
(User_Data : in out WisiToken.Syntax_Trees.User_Data_Type'Class;
Tree : in out WisiToken.Syntax_Trees.Tree;
Nonterm : in WisiToken.Syntax_Trees.Valid_Node_Access);
procedure private_extension_declaration_47
(User_Data : in out WisiToken.Syntax_Trees.User_Data_Type'Class;
Tree : in out WisiToken.Syntax_Trees.Tree;
Nonterm : in WisiToken.Syntax_Trees.Valid_Node_Access);
procedure overriding_indicator_0
(User_Data : in out WisiToken.Syntax_Trees.User_Data_Type'Class;
Tree : in out WisiToken.Syntax_Trees.Tree;
Nonterm : in WisiToken.Syntax_Trees.Valid_Node_Access);
procedure overriding_indicator_1
(User_Data : in out WisiToken.Syntax_Trees.User_Data_Type'Class;
Tree : in out WisiToken.Syntax_Trees.Tree;
Nonterm : in WisiToken.Syntax_Trees.Valid_Node_Access);
procedure use_package_clause_0
(User_Data : in out WisiToken.Syntax_Trees.User_Data_Type'Class;
Tree : in out WisiToken.Syntax_Trees.Tree;
Nonterm : in WisiToken.Syntax_Trees.Valid_Node_Access);
procedure use_type_clause_0
(User_Data : in out WisiToken.Syntax_Trees.User_Data_Type'Class;
Tree : in out WisiToken.Syntax_Trees.Tree;
Nonterm : in WisiToken.Syntax_Trees.Valid_Node_Access);
procedure use_type_clause_1
(User_Data : in out WisiToken.Syntax_Trees.User_Data_Type'Class;
Tree : in out WisiToken.Syntax_Trees.Tree;
Nonterm : in WisiToken.Syntax_Trees.Valid_Node_Access);
procedure object_renaming_declaration_0
(User_Data : in out WisiToken.Syntax_Trees.User_Data_Type'Class;
Tree : in out WisiToken.Syntax_Trees.Tree;
Nonterm : in WisiToken.Syntax_Trees.Valid_Node_Access);
procedure object_renaming_declaration_1
(User_Data : in out WisiToken.Syntax_Trees.User_Data_Type'Class;
Tree : in out WisiToken.Syntax_Trees.Tree;
Nonterm : in WisiToken.Syntax_Trees.Valid_Node_Access);
procedure object_renaming_declaration_2
(User_Data : in out WisiToken.Syntax_Trees.User_Data_Type'Class;
Tree : in out WisiToken.Syntax_Trees.Tree;
Nonterm : in WisiToken.Syntax_Trees.Valid_Node_Access);
procedure object_renaming_declaration_3
(User_Data : in out WisiToken.Syntax_Trees.User_Data_Type'Class;
Tree : in out WisiToken.Syntax_Trees.Tree;
Nonterm : in WisiToken.Syntax_Trees.Valid_Node_Access);
procedure object_renaming_declaration_4
(User_Data : in out WisiToken.Syntax_Trees.User_Data_Type'Class;
Tree : in out WisiToken.Syntax_Trees.Tree;
Nonterm : in WisiToken.Syntax_Trees.Valid_Node_Access);
procedure object_renaming_declaration_5
(User_Data : in out WisiToken.Syntax_Trees.User_Data_Type'Class;
Tree : in out WisiToken.Syntax_Trees.Tree;
Nonterm : in WisiToken.Syntax_Trees.Valid_Node_Access);
procedure object_renaming_declaration_6
(User_Data : in out WisiToken.Syntax_Trees.User_Data_Type'Class;
Tree : in out WisiToken.Syntax_Trees.Tree;
Nonterm : in WisiToken.Syntax_Trees.Valid_Node_Access);
procedure object_renaming_declaration_7
(User_Data : in out WisiToken.Syntax_Trees.User_Data_Type'Class;
Tree : in out WisiToken.Syntax_Trees.Tree;
Nonterm : in WisiToken.Syntax_Trees.Valid_Node_Access);
procedure exception_renaming_declaration_0
(User_Data : in out WisiToken.Syntax_Trees.User_Data_Type'Class;
Tree : in out WisiToken.Syntax_Trees.Tree;
Nonterm : in WisiToken.Syntax_Trees.Valid_Node_Access);
procedure exception_renaming_declaration_1
(User_Data : in out WisiToken.Syntax_Trees.User_Data_Type'Class;
Tree : in out WisiToken.Syntax_Trees.Tree;
Nonterm : in WisiToken.Syntax_Trees.Valid_Node_Access);
procedure package_renaming_declaration_0
(User_Data : in out WisiToken.Syntax_Trees.User_Data_Type'Class;
Tree : in out WisiToken.Syntax_Trees.Tree;
Nonterm : in WisiToken.Syntax_Trees.Valid_Node_Access);
procedure package_renaming_declaration_1
(User_Data : in out WisiToken.Syntax_Trees.User_Data_Type'Class;
Tree : in out WisiToken.Syntax_Trees.Tree;
Nonterm : in WisiToken.Syntax_Trees.Valid_Node_Access);
procedure subprogram_renaming_declaration_0
(User_Data : in out WisiToken.Syntax_Trees.User_Data_Type'Class;
Tree : in out WisiToken.Syntax_Trees.Tree;
Nonterm : in WisiToken.Syntax_Trees.Valid_Node_Access);
procedure subprogram_renaming_declaration_1
(User_Data : in out WisiToken.Syntax_Trees.User_Data_Type'Class;
Tree : in out WisiToken.Syntax_Trees.Tree;
Nonterm : in WisiToken.Syntax_Trees.Valid_Node_Access);
procedure subprogram_renaming_declaration_2
(User_Data : in out WisiToken.Syntax_Trees.User_Data_Type'Class;
Tree : in out WisiToken.Syntax_Trees.Tree;
Nonterm : in WisiToken.Syntax_Trees.Valid_Node_Access);
procedure subprogram_renaming_declaration_3
(User_Data : in out WisiToken.Syntax_Trees.User_Data_Type'Class;
Tree : in out WisiToken.Syntax_Trees.Tree;
Nonterm : in WisiToken.Syntax_Trees.Valid_Node_Access);
procedure generic_renaming_declaration_0
(User_Data : in out WisiToken.Syntax_Trees.User_Data_Type'Class;
Tree : in out WisiToken.Syntax_Trees.Tree;
Nonterm : in WisiToken.Syntax_Trees.Valid_Node_Access);
procedure generic_renaming_declaration_1
(User_Data : in out WisiToken.Syntax_Trees.User_Data_Type'Class;
Tree : in out WisiToken.Syntax_Trees.Tree;
Nonterm : in WisiToken.Syntax_Trees.Valid_Node_Access);
procedure generic_renaming_declaration_2
(User_Data : in out WisiToken.Syntax_Trees.User_Data_Type'Class;
Tree : in out WisiToken.Syntax_Trees.Tree;
Nonterm : in WisiToken.Syntax_Trees.Valid_Node_Access);
procedure generic_renaming_declaration_3
(User_Data : in out WisiToken.Syntax_Trees.User_Data_Type'Class;
Tree : in out WisiToken.Syntax_Trees.Tree;
Nonterm : in WisiToken.Syntax_Trees.Valid_Node_Access);
procedure generic_renaming_declaration_4
(User_Data : in out WisiToken.Syntax_Trees.User_Data_Type'Class;
Tree : in out WisiToken.Syntax_Trees.Tree;
Nonterm : in WisiToken.Syntax_Trees.Valid_Node_Access);
procedure generic_renaming_declaration_5
(User_Data : in out WisiToken.Syntax_Trees.User_Data_Type'Class;
Tree : in out WisiToken.Syntax_Trees.Tree;
Nonterm : in WisiToken.Syntax_Trees.Valid_Node_Access);
procedure task_type_declaration_0
(User_Data : in out WisiToken.Syntax_Trees.User_Data_Type'Class;
Tree : in out WisiToken.Syntax_Trees.Tree;
Nonterm : in WisiToken.Syntax_Trees.Valid_Node_Access);
procedure task_type_declaration_1
(User_Data : in out WisiToken.Syntax_Trees.User_Data_Type'Class;
Tree : in out WisiToken.Syntax_Trees.Tree;
Nonterm : in WisiToken.Syntax_Trees.Valid_Node_Access);
procedure task_type_declaration_2
(User_Data : in out WisiToken.Syntax_Trees.User_Data_Type'Class;
Tree : in out WisiToken.Syntax_Trees.Tree;
Nonterm : in WisiToken.Syntax_Trees.Valid_Node_Access);
procedure task_type_declaration_3
(User_Data : in out WisiToken.Syntax_Trees.User_Data_Type'Class;
Tree : in out WisiToken.Syntax_Trees.Tree;
Nonterm : in WisiToken.Syntax_Trees.Valid_Node_Access);
procedure task_type_declaration_4
(User_Data : in out WisiToken.Syntax_Trees.User_Data_Type'Class;
Tree : in out WisiToken.Syntax_Trees.Tree;
Nonterm : in WisiToken.Syntax_Trees.Valid_Node_Access);
procedure task_type_declaration_5
(User_Data : in out WisiToken.Syntax_Trees.User_Data_Type'Class;
Tree : in out WisiToken.Syntax_Trees.Tree;
Nonterm : in WisiToken.Syntax_Trees.Valid_Node_Access);
procedure task_type_declaration_6
(User_Data : in out WisiToken.Syntax_Trees.User_Data_Type'Class;
Tree : in out WisiToken.Syntax_Trees.Tree;
Nonterm : in WisiToken.Syntax_Trees.Valid_Node_Access);
procedure task_type_declaration_7
(User_Data : in out WisiToken.Syntax_Trees.User_Data_Type'Class;
Tree : in out WisiToken.Syntax_Trees.Tree;
Nonterm : in WisiToken.Syntax_Trees.Valid_Node_Access);
procedure task_type_declaration_8
(User_Data : in out WisiToken.Syntax_Trees.User_Data_Type'Class;
Tree : in out WisiToken.Syntax_Trees.Tree;
Nonterm : in WisiToken.Syntax_Trees.Valid_Node_Access);
procedure task_type_declaration_9
(User_Data : in out WisiToken.Syntax_Trees.User_Data_Type'Class;
Tree : in out WisiToken.Syntax_Trees.Tree;
Nonterm : in WisiToken.Syntax_Trees.Valid_Node_Access);
procedure task_type_declaration_10
(User_Data : in out WisiToken.Syntax_Trees.User_Data_Type'Class;
Tree : in out WisiToken.Syntax_Trees.Tree;
Nonterm : in WisiToken.Syntax_Trees.Valid_Node_Access);
procedure task_type_declaration_11
(User_Data : in out WisiToken.Syntax_Trees.User_Data_Type'Class;
Tree : in out WisiToken.Syntax_Trees.Tree;
Nonterm : in WisiToken.Syntax_Trees.Valid_Node_Access);
procedure single_task_declaration_0
(User_Data : in out WisiToken.Syntax_Trees.User_Data_Type'Class;
Tree : in out WisiToken.Syntax_Trees.Tree;
Nonterm : in WisiToken.Syntax_Trees.Valid_Node_Access);
procedure single_task_declaration_1
(User_Data : in out WisiToken.Syntax_Trees.User_Data_Type'Class;
Tree : in out WisiToken.Syntax_Trees.Tree;
Nonterm : in WisiToken.Syntax_Trees.Valid_Node_Access);
procedure single_task_declaration_2
(User_Data : in out WisiToken.Syntax_Trees.User_Data_Type'Class;
Tree : in out WisiToken.Syntax_Trees.Tree;
Nonterm : in WisiToken.Syntax_Trees.Valid_Node_Access);
procedure single_task_declaration_3
(User_Data : in out WisiToken.Syntax_Trees.User_Data_Type'Class;
Tree : in out WisiToken.Syntax_Trees.Tree;
Nonterm : in WisiToken.Syntax_Trees.Valid_Node_Access);
procedure single_task_declaration_4
(User_Data : in out WisiToken.Syntax_Trees.User_Data_Type'Class;
Tree : in out WisiToken.Syntax_Trees.Tree;
Nonterm : in WisiToken.Syntax_Trees.Valid_Node_Access);
procedure single_task_declaration_5
(User_Data : in out WisiToken.Syntax_Trees.User_Data_Type'Class;
Tree : in out WisiToken.Syntax_Trees.Tree;
Nonterm : in WisiToken.Syntax_Trees.Valid_Node_Access);
procedure task_definition_0
(User_Data : in out WisiToken.Syntax_Trees.User_Data_Type'Class;
Tree : in out WisiToken.Syntax_Trees.Tree;
Nonterm : in WisiToken.Syntax_Trees.Valid_Node_Access);
procedure task_definition_1
(User_Data : in out WisiToken.Syntax_Trees.User_Data_Type'Class;
Tree : in out WisiToken.Syntax_Trees.Tree;
Nonterm : in WisiToken.Syntax_Trees.Valid_Node_Access);
procedure task_body_0
(User_Data : in out WisiToken.Syntax_Trees.User_Data_Type'Class;
Tree : in out WisiToken.Syntax_Trees.Tree;
Nonterm : in WisiToken.Syntax_Trees.Valid_Node_Access);
procedure task_body_1
(User_Data : in out WisiToken.Syntax_Trees.User_Data_Type'Class;
Tree : in out WisiToken.Syntax_Trees.Tree;
Nonterm : in WisiToken.Syntax_Trees.Valid_Node_Access);
procedure protected_type_declaration_0
(User_Data : in out WisiToken.Syntax_Trees.User_Data_Type'Class;
Tree : in out WisiToken.Syntax_Trees.Tree;
Nonterm : in WisiToken.Syntax_Trees.Valid_Node_Access);
procedure protected_type_declaration_1
(User_Data : in out WisiToken.Syntax_Trees.User_Data_Type'Class;
Tree : in out WisiToken.Syntax_Trees.Tree;
Nonterm : in WisiToken.Syntax_Trees.Valid_Node_Access);
procedure protected_type_declaration_2
(User_Data : in out WisiToken.Syntax_Trees.User_Data_Type'Class;
Tree : in out WisiToken.Syntax_Trees.Tree;
Nonterm : in WisiToken.Syntax_Trees.Valid_Node_Access);
procedure protected_type_declaration_3
(User_Data : in out WisiToken.Syntax_Trees.User_Data_Type'Class;
Tree : in out WisiToken.Syntax_Trees.Tree;
Nonterm : in WisiToken.Syntax_Trees.Valid_Node_Access);
procedure protected_type_declaration_4
(User_Data : in out WisiToken.Syntax_Trees.User_Data_Type'Class;
Tree : in out WisiToken.Syntax_Trees.Tree;
Nonterm : in WisiToken.Syntax_Trees.Valid_Node_Access);
procedure protected_type_declaration_5
(User_Data : in out WisiToken.Syntax_Trees.User_Data_Type'Class;
Tree : in out WisiToken.Syntax_Trees.Tree;
Nonterm : in WisiToken.Syntax_Trees.Valid_Node_Access);
procedure protected_type_declaration_6
(User_Data : in out WisiToken.Syntax_Trees.User_Data_Type'Class;
Tree : in out WisiToken.Syntax_Trees.Tree;
Nonterm : in WisiToken.Syntax_Trees.Valid_Node_Access);
procedure protected_type_declaration_7
(User_Data : in out WisiToken.Syntax_Trees.User_Data_Type'Class;
Tree : in out WisiToken.Syntax_Trees.Tree;
Nonterm : in WisiToken.Syntax_Trees.Valid_Node_Access);
procedure single_protected_declaration_0
(User_Data : in out WisiToken.Syntax_Trees.User_Data_Type'Class;
Tree : in out WisiToken.Syntax_Trees.Tree;
Nonterm : in WisiToken.Syntax_Trees.Valid_Node_Access);
procedure single_protected_declaration_1
(User_Data : in out WisiToken.Syntax_Trees.User_Data_Type'Class;
Tree : in out WisiToken.Syntax_Trees.Tree;
Nonterm : in WisiToken.Syntax_Trees.Valid_Node_Access);
procedure single_protected_declaration_2
(User_Data : in out WisiToken.Syntax_Trees.User_Data_Type'Class;
Tree : in out WisiToken.Syntax_Trees.Tree;
Nonterm : in WisiToken.Syntax_Trees.Valid_Node_Access);
procedure single_protected_declaration_3
(User_Data : in out WisiToken.Syntax_Trees.User_Data_Type'Class;
Tree : in out WisiToken.Syntax_Trees.Tree;
Nonterm : in WisiToken.Syntax_Trees.Valid_Node_Access);
procedure protected_definition_0
(User_Data : in out WisiToken.Syntax_Trees.User_Data_Type'Class;
Tree : in out WisiToken.Syntax_Trees.Tree;
Nonterm : in WisiToken.Syntax_Trees.Valid_Node_Access);
procedure protected_definition_1
(User_Data : in out WisiToken.Syntax_Trees.User_Data_Type'Class;
Tree : in out WisiToken.Syntax_Trees.Tree;
Nonterm : in WisiToken.Syntax_Trees.Valid_Node_Access);
procedure protected_definition_2
(User_Data : in out WisiToken.Syntax_Trees.User_Data_Type'Class;
Tree : in out WisiToken.Syntax_Trees.Tree;
Nonterm : in WisiToken.Syntax_Trees.Valid_Node_Access);
procedure protected_definition_3
(User_Data : in out WisiToken.Syntax_Trees.User_Data_Type'Class;
Tree : in out WisiToken.Syntax_Trees.Tree;
Nonterm : in WisiToken.Syntax_Trees.Valid_Node_Access);
procedure protected_definition_4
(User_Data : in out WisiToken.Syntax_Trees.User_Data_Type'Class;
Tree : in out WisiToken.Syntax_Trees.Tree;
Nonterm : in WisiToken.Syntax_Trees.Valid_Node_Access);
procedure protected_definition_5
(User_Data : in out WisiToken.Syntax_Trees.User_Data_Type'Class;
Tree : in out WisiToken.Syntax_Trees.Tree;
Nonterm : in WisiToken.Syntax_Trees.Valid_Node_Access);
procedure protected_definition_6
(User_Data : in out WisiToken.Syntax_Trees.User_Data_Type'Class;
Tree : in out WisiToken.Syntax_Trees.Tree;
Nonterm : in WisiToken.Syntax_Trees.Valid_Node_Access);
procedure protected_definition_7
(User_Data : in out WisiToken.Syntax_Trees.User_Data_Type'Class;
Tree : in out WisiToken.Syntax_Trees.Tree;
Nonterm : in WisiToken.Syntax_Trees.Valid_Node_Access);
procedure protected_definition_8
(User_Data : in out WisiToken.Syntax_Trees.User_Data_Type'Class;
Tree : in out WisiToken.Syntax_Trees.Tree;
Nonterm : in WisiToken.Syntax_Trees.Valid_Node_Access);
procedure protected_definition_9
(User_Data : in out WisiToken.Syntax_Trees.User_Data_Type'Class;
Tree : in out WisiToken.Syntax_Trees.Tree;
Nonterm : in WisiToken.Syntax_Trees.Valid_Node_Access);
procedure protected_definition_10
(User_Data : in out WisiToken.Syntax_Trees.User_Data_Type'Class;
Tree : in out WisiToken.Syntax_Trees.Tree;
Nonterm : in WisiToken.Syntax_Trees.Valid_Node_Access);
procedure protected_definition_11
(User_Data : in out WisiToken.Syntax_Trees.User_Data_Type'Class;
Tree : in out WisiToken.Syntax_Trees.Tree;
Nonterm : in WisiToken.Syntax_Trees.Valid_Node_Access);
procedure protected_body_0
(User_Data : in out WisiToken.Syntax_Trees.User_Data_Type'Class;
Tree : in out WisiToken.Syntax_Trees.Tree;
Nonterm : in WisiToken.Syntax_Trees.Valid_Node_Access);
procedure protected_body_1
(User_Data : in out WisiToken.Syntax_Trees.User_Data_Type'Class;
Tree : in out WisiToken.Syntax_Trees.Tree;
Nonterm : in WisiToken.Syntax_Trees.Valid_Node_Access);
procedure protected_body_2
(User_Data : in out WisiToken.Syntax_Trees.User_Data_Type'Class;
Tree : in out WisiToken.Syntax_Trees.Tree;
Nonterm : in WisiToken.Syntax_Trees.Valid_Node_Access);
procedure protected_body_3
(User_Data : in out WisiToken.Syntax_Trees.User_Data_Type'Class;
Tree : in out WisiToken.Syntax_Trees.Tree;
Nonterm : in WisiToken.Syntax_Trees.Valid_Node_Access);
procedure entry_declaration_0
(User_Data : in out WisiToken.Syntax_Trees.User_Data_Type'Class;
Tree : in out WisiToken.Syntax_Trees.Tree;
Nonterm : in WisiToken.Syntax_Trees.Valid_Node_Access);
procedure entry_declaration_1
(User_Data : in out WisiToken.Syntax_Trees.User_Data_Type'Class;
Tree : in out WisiToken.Syntax_Trees.Tree;
Nonterm : in WisiToken.Syntax_Trees.Valid_Node_Access);
procedure entry_declaration_2
(User_Data : in out WisiToken.Syntax_Trees.User_Data_Type'Class;
Tree : in out WisiToken.Syntax_Trees.Tree;
Nonterm : in WisiToken.Syntax_Trees.Valid_Node_Access);
procedure entry_declaration_3
(User_Data : in out WisiToken.Syntax_Trees.User_Data_Type'Class;
Tree : in out WisiToken.Syntax_Trees.Tree;
Nonterm : in WisiToken.Syntax_Trees.Valid_Node_Access);
procedure entry_declaration_4
(User_Data : in out WisiToken.Syntax_Trees.User_Data_Type'Class;
Tree : in out WisiToken.Syntax_Trees.Tree;
Nonterm : in WisiToken.Syntax_Trees.Valid_Node_Access);
procedure entry_declaration_5
(User_Data : in out WisiToken.Syntax_Trees.User_Data_Type'Class;
Tree : in out WisiToken.Syntax_Trees.Tree;
Nonterm : in WisiToken.Syntax_Trees.Valid_Node_Access);
procedure entry_declaration_6
(User_Data : in out WisiToken.Syntax_Trees.User_Data_Type'Class;
Tree : in out WisiToken.Syntax_Trees.Tree;
Nonterm : in WisiToken.Syntax_Trees.Valid_Node_Access);
procedure entry_declaration_7
(User_Data : in out WisiToken.Syntax_Trees.User_Data_Type'Class;
Tree : in out WisiToken.Syntax_Trees.Tree;
Nonterm : in WisiToken.Syntax_Trees.Valid_Node_Access);
procedure accept_statement_0
(User_Data : in out WisiToken.Syntax_Trees.User_Data_Type'Class;
Tree : in out WisiToken.Syntax_Trees.Tree;
Nonterm : in WisiToken.Syntax_Trees.Valid_Node_Access);
procedure accept_statement_1
(User_Data : in out WisiToken.Syntax_Trees.User_Data_Type'Class;
Tree : in out WisiToken.Syntax_Trees.Tree;
Nonterm : in WisiToken.Syntax_Trees.Valid_Node_Access);
procedure accept_statement_2
(User_Data : in out WisiToken.Syntax_Trees.User_Data_Type'Class;
Tree : in out WisiToken.Syntax_Trees.Tree;
Nonterm : in WisiToken.Syntax_Trees.Valid_Node_Access);
procedure accept_statement_3
(User_Data : in out WisiToken.Syntax_Trees.User_Data_Type'Class;
Tree : in out WisiToken.Syntax_Trees.Tree;
Nonterm : in WisiToken.Syntax_Trees.Valid_Node_Access);
procedure entry_body_0
(User_Data : in out WisiToken.Syntax_Trees.User_Data_Type'Class;
Tree : in out WisiToken.Syntax_Trees.Tree;
Nonterm : in WisiToken.Syntax_Trees.Valid_Node_Access);
procedure entry_body_1
(User_Data : in out WisiToken.Syntax_Trees.User_Data_Type'Class;
Tree : in out WisiToken.Syntax_Trees.Tree;
Nonterm : in WisiToken.Syntax_Trees.Valid_Node_Access);
procedure entry_body_formal_part_0
(User_Data : in out WisiToken.Syntax_Trees.User_Data_Type'Class;
Tree : in out WisiToken.Syntax_Trees.Tree;
Nonterm : in WisiToken.Syntax_Trees.Valid_Node_Access);
procedure entry_body_formal_part_1
(User_Data : in out WisiToken.Syntax_Trees.User_Data_Type'Class;
Tree : in out WisiToken.Syntax_Trees.Tree;
Nonterm : in WisiToken.Syntax_Trees.Valid_Node_Access);
procedure entry_barrier_0
(User_Data : in out WisiToken.Syntax_Trees.User_Data_Type'Class;
Tree : in out WisiToken.Syntax_Trees.Tree;
Nonterm : in WisiToken.Syntax_Trees.Valid_Node_Access);
procedure requeue_statement_0
(User_Data : in out WisiToken.Syntax_Trees.User_Data_Type'Class;
Tree : in out WisiToken.Syntax_Trees.Tree;
Nonterm : in WisiToken.Syntax_Trees.Valid_Node_Access);
procedure requeue_statement_1
(User_Data : in out WisiToken.Syntax_Trees.User_Data_Type'Class;
Tree : in out WisiToken.Syntax_Trees.Tree;
Nonterm : in WisiToken.Syntax_Trees.Valid_Node_Access);
procedure delay_until_statement_0
(User_Data : in out WisiToken.Syntax_Trees.User_Data_Type'Class;
Tree : in out WisiToken.Syntax_Trees.Tree;
Nonterm : in WisiToken.Syntax_Trees.Valid_Node_Access);
procedure delay_relative_statement_0
(User_Data : in out WisiToken.Syntax_Trees.User_Data_Type'Class;
Tree : in out WisiToken.Syntax_Trees.Tree;
Nonterm : in WisiToken.Syntax_Trees.Valid_Node_Access);
procedure guard_select_0
(User_Data : in out WisiToken.Syntax_Trees.User_Data_Type'Class;
Tree : in out WisiToken.Syntax_Trees.Tree;
Nonterm : in WisiToken.Syntax_Trees.Valid_Node_Access);
procedure select_alternative_list_1
(User_Data : in out WisiToken.Syntax_Trees.User_Data_Type'Class;
Tree : in out WisiToken.Syntax_Trees.Tree;
Nonterm : in WisiToken.Syntax_Trees.Valid_Node_Access);
procedure selective_accept_0
(User_Data : in out WisiToken.Syntax_Trees.User_Data_Type'Class;
Tree : in out WisiToken.Syntax_Trees.Tree;
Nonterm : in WisiToken.Syntax_Trees.Valid_Node_Access);
procedure selective_accept_1
(User_Data : in out WisiToken.Syntax_Trees.User_Data_Type'Class;
Tree : in out WisiToken.Syntax_Trees.Tree;
Nonterm : in WisiToken.Syntax_Trees.Valid_Node_Access);
procedure guard_0
(User_Data : in out WisiToken.Syntax_Trees.User_Data_Type'Class;
Tree : in out WisiToken.Syntax_Trees.Tree;
Nonterm : in WisiToken.Syntax_Trees.Valid_Node_Access);
procedure terminate_alternative_0
(User_Data : in out WisiToken.Syntax_Trees.User_Data_Type'Class;
Tree : in out WisiToken.Syntax_Trees.Tree;
Nonterm : in WisiToken.Syntax_Trees.Valid_Node_Access);
procedure timed_entry_call_0
(User_Data : in out WisiToken.Syntax_Trees.User_Data_Type'Class;
Tree : in out WisiToken.Syntax_Trees.Tree;
Nonterm : in WisiToken.Syntax_Trees.Valid_Node_Access);
procedure conditional_entry_call_0
(User_Data : in out WisiToken.Syntax_Trees.User_Data_Type'Class;
Tree : in out WisiToken.Syntax_Trees.Tree;
Nonterm : in WisiToken.Syntax_Trees.Valid_Node_Access);
procedure asynchronous_select_0
(User_Data : in out WisiToken.Syntax_Trees.User_Data_Type'Class;
Tree : in out WisiToken.Syntax_Trees.Tree;
Nonterm : in WisiToken.Syntax_Trees.Valid_Node_Access);
procedure abort_statement_0
(User_Data : in out WisiToken.Syntax_Trees.User_Data_Type'Class;
Tree : in out WisiToken.Syntax_Trees.Tree;
Nonterm : in WisiToken.Syntax_Trees.Valid_Node_Access);
procedure compilation_0
(User_Data : in out WisiToken.Syntax_Trees.User_Data_Type'Class;
Tree : in out WisiToken.Syntax_Trees.Tree;
Nonterm : in WisiToken.Syntax_Trees.Valid_Node_Access);
procedure compilation_1
(User_Data : in out WisiToken.Syntax_Trees.User_Data_Type'Class;
Tree : in out WisiToken.Syntax_Trees.Tree;
Nonterm : in WisiToken.Syntax_Trees.Valid_Node_Access);
procedure compilation_unit_1
(User_Data : in out WisiToken.Syntax_Trees.User_Data_Type'Class;
Tree : in out WisiToken.Syntax_Trees.Tree;
Nonterm : in WisiToken.Syntax_Trees.Valid_Node_Access);
procedure compilation_unit_2
(User_Data : in out WisiToken.Syntax_Trees.User_Data_Type'Class;
Tree : in out WisiToken.Syntax_Trees.Tree;
Nonterm : in WisiToken.Syntax_Trees.Valid_Node_Access);
procedure limited_with_clause_0
(User_Data : in out WisiToken.Syntax_Trees.User_Data_Type'Class;
Tree : in out WisiToken.Syntax_Trees.Tree;
Nonterm : in WisiToken.Syntax_Trees.Valid_Node_Access);
procedure limited_with_clause_1
(User_Data : in out WisiToken.Syntax_Trees.User_Data_Type'Class;
Tree : in out WisiToken.Syntax_Trees.Tree;
Nonterm : in WisiToken.Syntax_Trees.Valid_Node_Access);
procedure nonlimited_with_clause_0
(User_Data : in out WisiToken.Syntax_Trees.User_Data_Type'Class;
Tree : in out WisiToken.Syntax_Trees.Tree;
Nonterm : in WisiToken.Syntax_Trees.Valid_Node_Access);
procedure nonlimited_with_clause_1
(User_Data : in out WisiToken.Syntax_Trees.User_Data_Type'Class;
Tree : in out WisiToken.Syntax_Trees.Tree;
Nonterm : in WisiToken.Syntax_Trees.Valid_Node_Access);
procedure subprogram_body_stub_0
(User_Data : in out WisiToken.Syntax_Trees.User_Data_Type'Class;
Tree : in out WisiToken.Syntax_Trees.Tree;
Nonterm : in WisiToken.Syntax_Trees.Valid_Node_Access);
procedure subprogram_body_stub_1
(User_Data : in out WisiToken.Syntax_Trees.User_Data_Type'Class;
Tree : in out WisiToken.Syntax_Trees.Tree;
Nonterm : in WisiToken.Syntax_Trees.Valid_Node_Access);
procedure subprogram_body_stub_2
(User_Data : in out WisiToken.Syntax_Trees.User_Data_Type'Class;
Tree : in out WisiToken.Syntax_Trees.Tree;
Nonterm : in WisiToken.Syntax_Trees.Valid_Node_Access);
procedure subprogram_body_stub_3
(User_Data : in out WisiToken.Syntax_Trees.User_Data_Type'Class;
Tree : in out WisiToken.Syntax_Trees.Tree;
Nonterm : in WisiToken.Syntax_Trees.Valid_Node_Access);
procedure package_body_stub_0
(User_Data : in out WisiToken.Syntax_Trees.User_Data_Type'Class;
Tree : in out WisiToken.Syntax_Trees.Tree;
Nonterm : in WisiToken.Syntax_Trees.Valid_Node_Access);
procedure package_body_stub_1
(User_Data : in out WisiToken.Syntax_Trees.User_Data_Type'Class;
Tree : in out WisiToken.Syntax_Trees.Tree;
Nonterm : in WisiToken.Syntax_Trees.Valid_Node_Access);
procedure task_body_stub_0
(User_Data : in out WisiToken.Syntax_Trees.User_Data_Type'Class;
Tree : in out WisiToken.Syntax_Trees.Tree;
Nonterm : in WisiToken.Syntax_Trees.Valid_Node_Access);
procedure task_body_stub_1
(User_Data : in out WisiToken.Syntax_Trees.User_Data_Type'Class;
Tree : in out WisiToken.Syntax_Trees.Tree;
Nonterm : in WisiToken.Syntax_Trees.Valid_Node_Access);
procedure protected_body_stub_0
(User_Data : in out WisiToken.Syntax_Trees.User_Data_Type'Class;
Tree : in out WisiToken.Syntax_Trees.Tree;
Nonterm : in WisiToken.Syntax_Trees.Valid_Node_Access);
procedure protected_body_stub_1
(User_Data : in out WisiToken.Syntax_Trees.User_Data_Type'Class;
Tree : in out WisiToken.Syntax_Trees.Tree;
Nonterm : in WisiToken.Syntax_Trees.Valid_Node_Access);
procedure subunit_0
(User_Data : in out WisiToken.Syntax_Trees.User_Data_Type'Class;
Tree : in out WisiToken.Syntax_Trees.Tree;
Nonterm : in WisiToken.Syntax_Trees.Valid_Node_Access);
procedure exception_declaration_0
(User_Data : in out WisiToken.Syntax_Trees.User_Data_Type'Class;
Tree : in out WisiToken.Syntax_Trees.Tree;
Nonterm : in WisiToken.Syntax_Trees.Valid_Node_Access);
procedure exception_declaration_1
(User_Data : in out WisiToken.Syntax_Trees.User_Data_Type'Class;
Tree : in out WisiToken.Syntax_Trees.Tree;
Nonterm : in WisiToken.Syntax_Trees.Valid_Node_Access);
procedure exception_handler_list_2
(User_Data : in out WisiToken.Syntax_Trees.User_Data_Type'Class;
Tree : in out WisiToken.Syntax_Trees.Tree;
Nonterm : in WisiToken.Syntax_Trees.Valid_Node_Access);
procedure handled_sequence_of_statements_0
(User_Data : in out WisiToken.Syntax_Trees.User_Data_Type'Class;
Tree : in out WisiToken.Syntax_Trees.Tree;
Nonterm : in WisiToken.Syntax_Trees.Valid_Node_Access);
procedure handled_sequence_of_statements_1
(User_Data : in out WisiToken.Syntax_Trees.User_Data_Type'Class;
Tree : in out WisiToken.Syntax_Trees.Tree;
Nonterm : in WisiToken.Syntax_Trees.Valid_Node_Access);
procedure exception_handler_0
(User_Data : in out WisiToken.Syntax_Trees.User_Data_Type'Class;
Tree : in out WisiToken.Syntax_Trees.Tree;
Nonterm : in WisiToken.Syntax_Trees.Valid_Node_Access);
procedure exception_handler_1
(User_Data : in out WisiToken.Syntax_Trees.User_Data_Type'Class;
Tree : in out WisiToken.Syntax_Trees.Tree;
Nonterm : in WisiToken.Syntax_Trees.Valid_Node_Access);
procedure raise_statement_0
(User_Data : in out WisiToken.Syntax_Trees.User_Data_Type'Class;
Tree : in out WisiToken.Syntax_Trees.Tree;
Nonterm : in WisiToken.Syntax_Trees.Valid_Node_Access);
procedure raise_statement_1
(User_Data : in out WisiToken.Syntax_Trees.User_Data_Type'Class;
Tree : in out WisiToken.Syntax_Trees.Tree;
Nonterm : in WisiToken.Syntax_Trees.Valid_Node_Access);
procedure raise_statement_2
(User_Data : in out WisiToken.Syntax_Trees.User_Data_Type'Class;
Tree : in out WisiToken.Syntax_Trees.Tree;
Nonterm : in WisiToken.Syntax_Trees.Valid_Node_Access);
procedure raise_expression_0
(User_Data : in out WisiToken.Syntax_Trees.User_Data_Type'Class;
Tree : in out WisiToken.Syntax_Trees.Tree;
Nonterm : in WisiToken.Syntax_Trees.Valid_Node_Access);
procedure raise_expression_1
(User_Data : in out WisiToken.Syntax_Trees.User_Data_Type'Class;
Tree : in out WisiToken.Syntax_Trees.Tree;
Nonterm : in WisiToken.Syntax_Trees.Valid_Node_Access);
procedure generic_subprogram_declaration_0
(User_Data : in out WisiToken.Syntax_Trees.User_Data_Type'Class;
Tree : in out WisiToken.Syntax_Trees.Tree;
Nonterm : in WisiToken.Syntax_Trees.Valid_Node_Access);
procedure generic_subprogram_declaration_1
(User_Data : in out WisiToken.Syntax_Trees.User_Data_Type'Class;
Tree : in out WisiToken.Syntax_Trees.Tree;
Nonterm : in WisiToken.Syntax_Trees.Valid_Node_Access);
procedure generic_package_declaration_0
(User_Data : in out WisiToken.Syntax_Trees.User_Data_Type'Class;
Tree : in out WisiToken.Syntax_Trees.Tree;
Nonterm : in WisiToken.Syntax_Trees.Valid_Node_Access);
procedure generic_formal_part_0
(User_Data : in out WisiToken.Syntax_Trees.User_Data_Type'Class;
Tree : in out WisiToken.Syntax_Trees.Tree;
Nonterm : in WisiToken.Syntax_Trees.Valid_Node_Access);
procedure generic_formal_part_1
(User_Data : in out WisiToken.Syntax_Trees.User_Data_Type'Class;
Tree : in out WisiToken.Syntax_Trees.Tree;
Nonterm : in WisiToken.Syntax_Trees.Valid_Node_Access);
procedure generic_instantiation_0
(User_Data : in out WisiToken.Syntax_Trees.User_Data_Type'Class;
Tree : in out WisiToken.Syntax_Trees.Tree;
Nonterm : in WisiToken.Syntax_Trees.Valid_Node_Access);
procedure generic_instantiation_1
(User_Data : in out WisiToken.Syntax_Trees.User_Data_Type'Class;
Tree : in out WisiToken.Syntax_Trees.Tree;
Nonterm : in WisiToken.Syntax_Trees.Valid_Node_Access);
procedure generic_instantiation_2
(User_Data : in out WisiToken.Syntax_Trees.User_Data_Type'Class;
Tree : in out WisiToken.Syntax_Trees.Tree;
Nonterm : in WisiToken.Syntax_Trees.Valid_Node_Access);
procedure generic_instantiation_3
(User_Data : in out WisiToken.Syntax_Trees.User_Data_Type'Class;
Tree : in out WisiToken.Syntax_Trees.Tree;
Nonterm : in WisiToken.Syntax_Trees.Valid_Node_Access);
procedure generic_instantiation_4
(User_Data : in out WisiToken.Syntax_Trees.User_Data_Type'Class;
Tree : in out WisiToken.Syntax_Trees.Tree;
Nonterm : in WisiToken.Syntax_Trees.Valid_Node_Access);
procedure generic_instantiation_5
(User_Data : in out WisiToken.Syntax_Trees.User_Data_Type'Class;
Tree : in out WisiToken.Syntax_Trees.Tree;
Nonterm : in WisiToken.Syntax_Trees.Valid_Node_Access);
procedure generic_instantiation_6
(User_Data : in out WisiToken.Syntax_Trees.User_Data_Type'Class;
Tree : in out WisiToken.Syntax_Trees.Tree;
Nonterm : in WisiToken.Syntax_Trees.Valid_Node_Access);
procedure generic_instantiation_7
(User_Data : in out WisiToken.Syntax_Trees.User_Data_Type'Class;
Tree : in out WisiToken.Syntax_Trees.Tree;
Nonterm : in WisiToken.Syntax_Trees.Valid_Node_Access);
procedure generic_instantiation_8
(User_Data : in out WisiToken.Syntax_Trees.User_Data_Type'Class;
Tree : in out WisiToken.Syntax_Trees.Tree;
Nonterm : in WisiToken.Syntax_Trees.Valid_Node_Access);
procedure generic_instantiation_9
(User_Data : in out WisiToken.Syntax_Trees.User_Data_Type'Class;
Tree : in out WisiToken.Syntax_Trees.Tree;
Nonterm : in WisiToken.Syntax_Trees.Valid_Node_Access);
procedure formal_object_declaration_0
(User_Data : in out WisiToken.Syntax_Trees.User_Data_Type'Class;
Tree : in out WisiToken.Syntax_Trees.Tree;
Nonterm : in WisiToken.Syntax_Trees.Valid_Node_Access);
procedure formal_object_declaration_1
(User_Data : in out WisiToken.Syntax_Trees.User_Data_Type'Class;
Tree : in out WisiToken.Syntax_Trees.Tree;
Nonterm : in WisiToken.Syntax_Trees.Valid_Node_Access);
procedure formal_object_declaration_2
(User_Data : in out WisiToken.Syntax_Trees.User_Data_Type'Class;
Tree : in out WisiToken.Syntax_Trees.Tree;
Nonterm : in WisiToken.Syntax_Trees.Valid_Node_Access);
procedure formal_object_declaration_3
(User_Data : in out WisiToken.Syntax_Trees.User_Data_Type'Class;
Tree : in out WisiToken.Syntax_Trees.Tree;
Nonterm : in WisiToken.Syntax_Trees.Valid_Node_Access);
procedure formal_object_declaration_4
(User_Data : in out WisiToken.Syntax_Trees.User_Data_Type'Class;
Tree : in out WisiToken.Syntax_Trees.Tree;
Nonterm : in WisiToken.Syntax_Trees.Valid_Node_Access);
procedure formal_object_declaration_5
(User_Data : in out WisiToken.Syntax_Trees.User_Data_Type'Class;
Tree : in out WisiToken.Syntax_Trees.Tree;
Nonterm : in WisiToken.Syntax_Trees.Valid_Node_Access);
procedure formal_object_declaration_6
(User_Data : in out WisiToken.Syntax_Trees.User_Data_Type'Class;
Tree : in out WisiToken.Syntax_Trees.Tree;
Nonterm : in WisiToken.Syntax_Trees.Valid_Node_Access);
procedure formal_object_declaration_7
(User_Data : in out WisiToken.Syntax_Trees.User_Data_Type'Class;
Tree : in out WisiToken.Syntax_Trees.Tree;
Nonterm : in WisiToken.Syntax_Trees.Valid_Node_Access);
procedure formal_object_declaration_8
(User_Data : in out WisiToken.Syntax_Trees.User_Data_Type'Class;
Tree : in out WisiToken.Syntax_Trees.Tree;
Nonterm : in WisiToken.Syntax_Trees.Valid_Node_Access);
procedure formal_object_declaration_9
(User_Data : in out WisiToken.Syntax_Trees.User_Data_Type'Class;
Tree : in out WisiToken.Syntax_Trees.Tree;
Nonterm : in WisiToken.Syntax_Trees.Valid_Node_Access);
procedure formal_object_declaration_10
(User_Data : in out WisiToken.Syntax_Trees.User_Data_Type'Class;
Tree : in out WisiToken.Syntax_Trees.Tree;
Nonterm : in WisiToken.Syntax_Trees.Valid_Node_Access);
procedure formal_object_declaration_11
(User_Data : in out WisiToken.Syntax_Trees.User_Data_Type'Class;
Tree : in out WisiToken.Syntax_Trees.Tree;
Nonterm : in WisiToken.Syntax_Trees.Valid_Node_Access);
procedure formal_complete_type_declaration_0
(User_Data : in out WisiToken.Syntax_Trees.User_Data_Type'Class;
Tree : in out WisiToken.Syntax_Trees.Tree;
Nonterm : in WisiToken.Syntax_Trees.Valid_Node_Access);
procedure formal_complete_type_declaration_1
(User_Data : in out WisiToken.Syntax_Trees.User_Data_Type'Class;
Tree : in out WisiToken.Syntax_Trees.Tree;
Nonterm : in WisiToken.Syntax_Trees.Valid_Node_Access);
procedure formal_complete_type_declaration_2
(User_Data : in out WisiToken.Syntax_Trees.User_Data_Type'Class;
Tree : in out WisiToken.Syntax_Trees.Tree;
Nonterm : in WisiToken.Syntax_Trees.Valid_Node_Access);
procedure formal_complete_type_declaration_3
(User_Data : in out WisiToken.Syntax_Trees.User_Data_Type'Class;
Tree : in out WisiToken.Syntax_Trees.Tree;
Nonterm : in WisiToken.Syntax_Trees.Valid_Node_Access);
procedure formal_complete_type_declaration_4
(User_Data : in out WisiToken.Syntax_Trees.User_Data_Type'Class;
Tree : in out WisiToken.Syntax_Trees.Tree;
Nonterm : in WisiToken.Syntax_Trees.Valid_Node_Access);
procedure formal_complete_type_declaration_5
(User_Data : in out WisiToken.Syntax_Trees.User_Data_Type'Class;
Tree : in out WisiToken.Syntax_Trees.Tree;
Nonterm : in WisiToken.Syntax_Trees.Valid_Node_Access);
procedure formal_complete_type_declaration_6
(User_Data : in out WisiToken.Syntax_Trees.User_Data_Type'Class;
Tree : in out WisiToken.Syntax_Trees.Tree;
Nonterm : in WisiToken.Syntax_Trees.Valid_Node_Access);
procedure formal_complete_type_declaration_7
(User_Data : in out WisiToken.Syntax_Trees.User_Data_Type'Class;
Tree : in out WisiToken.Syntax_Trees.Tree;
Nonterm : in WisiToken.Syntax_Trees.Valid_Node_Access);
procedure formal_incomplete_type_declaration_0
(User_Data : in out WisiToken.Syntax_Trees.User_Data_Type'Class;
Tree : in out WisiToken.Syntax_Trees.Tree;
Nonterm : in WisiToken.Syntax_Trees.Valid_Node_Access);
procedure formal_incomplete_type_declaration_1
(User_Data : in out WisiToken.Syntax_Trees.User_Data_Type'Class;
Tree : in out WisiToken.Syntax_Trees.Tree;
Nonterm : in WisiToken.Syntax_Trees.Valid_Node_Access);
procedure formal_incomplete_type_declaration_2
(User_Data : in out WisiToken.Syntax_Trees.User_Data_Type'Class;
Tree : in out WisiToken.Syntax_Trees.Tree;
Nonterm : in WisiToken.Syntax_Trees.Valid_Node_Access);
procedure formal_incomplete_type_declaration_3
(User_Data : in out WisiToken.Syntax_Trees.User_Data_Type'Class;
Tree : in out WisiToken.Syntax_Trees.Tree;
Nonterm : in WisiToken.Syntax_Trees.Valid_Node_Access);
procedure formal_incomplete_type_declaration_4
(User_Data : in out WisiToken.Syntax_Trees.User_Data_Type'Class;
Tree : in out WisiToken.Syntax_Trees.Tree;
Nonterm : in WisiToken.Syntax_Trees.Valid_Node_Access);
procedure formal_incomplete_type_declaration_5
(User_Data : in out WisiToken.Syntax_Trees.User_Data_Type'Class;
Tree : in out WisiToken.Syntax_Trees.Tree;
Nonterm : in WisiToken.Syntax_Trees.Valid_Node_Access);
procedure formal_incomplete_type_declaration_6
(User_Data : in out WisiToken.Syntax_Trees.User_Data_Type'Class;
Tree : in out WisiToken.Syntax_Trees.Tree;
Nonterm : in WisiToken.Syntax_Trees.Valid_Node_Access);
procedure formal_incomplete_type_declaration_7
(User_Data : in out WisiToken.Syntax_Trees.User_Data_Type'Class;
Tree : in out WisiToken.Syntax_Trees.Tree;
Nonterm : in WisiToken.Syntax_Trees.Valid_Node_Access);
procedure formal_derived_type_definition_0
(User_Data : in out WisiToken.Syntax_Trees.User_Data_Type'Class;
Tree : in out WisiToken.Syntax_Trees.Tree;
Nonterm : in WisiToken.Syntax_Trees.Valid_Node_Access);
procedure formal_derived_type_definition_1
(User_Data : in out WisiToken.Syntax_Trees.User_Data_Type'Class;
Tree : in out WisiToken.Syntax_Trees.Tree;
Nonterm : in WisiToken.Syntax_Trees.Valid_Node_Access);
procedure formal_derived_type_definition_2
(User_Data : in out WisiToken.Syntax_Trees.User_Data_Type'Class;
Tree : in out WisiToken.Syntax_Trees.Tree;
Nonterm : in WisiToken.Syntax_Trees.Valid_Node_Access);
procedure formal_derived_type_definition_3
(User_Data : in out WisiToken.Syntax_Trees.User_Data_Type'Class;
Tree : in out WisiToken.Syntax_Trees.Tree;
Nonterm : in WisiToken.Syntax_Trees.Valid_Node_Access);
procedure formal_derived_type_definition_4
(User_Data : in out WisiToken.Syntax_Trees.User_Data_Type'Class;
Tree : in out WisiToken.Syntax_Trees.Tree;
Nonterm : in WisiToken.Syntax_Trees.Valid_Node_Access);
procedure formal_derived_type_definition_5
(User_Data : in out WisiToken.Syntax_Trees.User_Data_Type'Class;
Tree : in out WisiToken.Syntax_Trees.Tree;
Nonterm : in WisiToken.Syntax_Trees.Valid_Node_Access);
procedure formal_derived_type_definition_6
(User_Data : in out WisiToken.Syntax_Trees.User_Data_Type'Class;
Tree : in out WisiToken.Syntax_Trees.Tree;
Nonterm : in WisiToken.Syntax_Trees.Valid_Node_Access);
procedure formal_derived_type_definition_7
(User_Data : in out WisiToken.Syntax_Trees.User_Data_Type'Class;
Tree : in out WisiToken.Syntax_Trees.Tree;
Nonterm : in WisiToken.Syntax_Trees.Valid_Node_Access);
procedure formal_derived_type_definition_8
(User_Data : in out WisiToken.Syntax_Trees.User_Data_Type'Class;
Tree : in out WisiToken.Syntax_Trees.Tree;
Nonterm : in WisiToken.Syntax_Trees.Valid_Node_Access);
procedure formal_derived_type_definition_9
(User_Data : in out WisiToken.Syntax_Trees.User_Data_Type'Class;
Tree : in out WisiToken.Syntax_Trees.Tree;
Nonterm : in WisiToken.Syntax_Trees.Valid_Node_Access);
procedure formal_derived_type_definition_10
(User_Data : in out WisiToken.Syntax_Trees.User_Data_Type'Class;
Tree : in out WisiToken.Syntax_Trees.Tree;
Nonterm : in WisiToken.Syntax_Trees.Valid_Node_Access);
procedure formal_derived_type_definition_11
(User_Data : in out WisiToken.Syntax_Trees.User_Data_Type'Class;
Tree : in out WisiToken.Syntax_Trees.Tree;
Nonterm : in WisiToken.Syntax_Trees.Valid_Node_Access);
procedure formal_derived_type_definition_12
(User_Data : in out WisiToken.Syntax_Trees.User_Data_Type'Class;
Tree : in out WisiToken.Syntax_Trees.Tree;
Nonterm : in WisiToken.Syntax_Trees.Valid_Node_Access);
procedure formal_derived_type_definition_13
(User_Data : in out WisiToken.Syntax_Trees.User_Data_Type'Class;
Tree : in out WisiToken.Syntax_Trees.Tree;
Nonterm : in WisiToken.Syntax_Trees.Valid_Node_Access);
procedure formal_derived_type_definition_14
(User_Data : in out WisiToken.Syntax_Trees.User_Data_Type'Class;
Tree : in out WisiToken.Syntax_Trees.Tree;
Nonterm : in WisiToken.Syntax_Trees.Valid_Node_Access);
procedure formal_derived_type_definition_15
(User_Data : in out WisiToken.Syntax_Trees.User_Data_Type'Class;
Tree : in out WisiToken.Syntax_Trees.Tree;
Nonterm : in WisiToken.Syntax_Trees.Valid_Node_Access);
procedure formal_derived_type_definition_16
(User_Data : in out WisiToken.Syntax_Trees.User_Data_Type'Class;
Tree : in out WisiToken.Syntax_Trees.Tree;
Nonterm : in WisiToken.Syntax_Trees.Valid_Node_Access);
procedure formal_derived_type_definition_17
(User_Data : in out WisiToken.Syntax_Trees.User_Data_Type'Class;
Tree : in out WisiToken.Syntax_Trees.Tree;
Nonterm : in WisiToken.Syntax_Trees.Valid_Node_Access);
procedure formal_concrete_subprogram_declaration_0
(User_Data : in out WisiToken.Syntax_Trees.User_Data_Type'Class;
Tree : in out WisiToken.Syntax_Trees.Tree;
Nonterm : in WisiToken.Syntax_Trees.Valid_Node_Access);
procedure formal_concrete_subprogram_declaration_1
(User_Data : in out WisiToken.Syntax_Trees.User_Data_Type'Class;
Tree : in out WisiToken.Syntax_Trees.Tree;
Nonterm : in WisiToken.Syntax_Trees.Valid_Node_Access);
procedure formal_concrete_subprogram_declaration_2
(User_Data : in out WisiToken.Syntax_Trees.User_Data_Type'Class;
Tree : in out WisiToken.Syntax_Trees.Tree;
Nonterm : in WisiToken.Syntax_Trees.Valid_Node_Access);
procedure formal_concrete_subprogram_declaration_3
(User_Data : in out WisiToken.Syntax_Trees.User_Data_Type'Class;
Tree : in out WisiToken.Syntax_Trees.Tree;
Nonterm : in WisiToken.Syntax_Trees.Valid_Node_Access);
procedure formal_abstract_subprogram_declaration_0
(User_Data : in out WisiToken.Syntax_Trees.User_Data_Type'Class;
Tree : in out WisiToken.Syntax_Trees.Tree;
Nonterm : in WisiToken.Syntax_Trees.Valid_Node_Access);
procedure formal_abstract_subprogram_declaration_1
(User_Data : in out WisiToken.Syntax_Trees.User_Data_Type'Class;
Tree : in out WisiToken.Syntax_Trees.Tree;
Nonterm : in WisiToken.Syntax_Trees.Valid_Node_Access);
procedure formal_abstract_subprogram_declaration_2
(User_Data : in out WisiToken.Syntax_Trees.User_Data_Type'Class;
Tree : in out WisiToken.Syntax_Trees.Tree;
Nonterm : in WisiToken.Syntax_Trees.Valid_Node_Access);
procedure formal_abstract_subprogram_declaration_3
(User_Data : in out WisiToken.Syntax_Trees.User_Data_Type'Class;
Tree : in out WisiToken.Syntax_Trees.Tree;
Nonterm : in WisiToken.Syntax_Trees.Valid_Node_Access);
procedure default_name_0
(User_Data : in out WisiToken.Syntax_Trees.User_Data_Type'Class;
Tree : in out WisiToken.Syntax_Trees.Tree;
Nonterm : in WisiToken.Syntax_Trees.Valid_Node_Access);
procedure formal_package_declaration_0
(User_Data : in out WisiToken.Syntax_Trees.User_Data_Type'Class;
Tree : in out WisiToken.Syntax_Trees.Tree;
Nonterm : in WisiToken.Syntax_Trees.Valid_Node_Access);
procedure formal_package_declaration_1
(User_Data : in out WisiToken.Syntax_Trees.User_Data_Type'Class;
Tree : in out WisiToken.Syntax_Trees.Tree;
Nonterm : in WisiToken.Syntax_Trees.Valid_Node_Access);
procedure aspect_association_0
(User_Data : in out WisiToken.Syntax_Trees.User_Data_Type'Class;
Tree : in out WisiToken.Syntax_Trees.Tree;
Nonterm : in WisiToken.Syntax_Trees.Valid_Node_Access);
procedure aspect_association_1
(User_Data : in out WisiToken.Syntax_Trees.User_Data_Type'Class;
Tree : in out WisiToken.Syntax_Trees.Tree;
Nonterm : in WisiToken.Syntax_Trees.Valid_Node_Access);
procedure aspect_specification_0
(User_Data : in out WisiToken.Syntax_Trees.User_Data_Type'Class;
Tree : in out WisiToken.Syntax_Trees.Tree;
Nonterm : in WisiToken.Syntax_Trees.Valid_Node_Access);
procedure attribute_definition_clause_0
(User_Data : in out WisiToken.Syntax_Trees.User_Data_Type'Class;
Tree : in out WisiToken.Syntax_Trees.Tree;
Nonterm : in WisiToken.Syntax_Trees.Valid_Node_Access);
procedure enumeration_representation_clause_0
(User_Data : in out WisiToken.Syntax_Trees.User_Data_Type'Class;
Tree : in out WisiToken.Syntax_Trees.Tree;
Nonterm : in WisiToken.Syntax_Trees.Valid_Node_Access);
procedure record_representation_clause_0
(User_Data : in out WisiToken.Syntax_Trees.User_Data_Type'Class;
Tree : in out WisiToken.Syntax_Trees.Tree;
Nonterm : in WisiToken.Syntax_Trees.Valid_Node_Access);
procedure record_representation_clause_1
(User_Data : in out WisiToken.Syntax_Trees.User_Data_Type'Class;
Tree : in out WisiToken.Syntax_Trees.Tree;
Nonterm : in WisiToken.Syntax_Trees.Valid_Node_Access);
procedure record_representation_clause_2
(User_Data : in out WisiToken.Syntax_Trees.User_Data_Type'Class;
Tree : in out WisiToken.Syntax_Trees.Tree;
Nonterm : in WisiToken.Syntax_Trees.Valid_Node_Access);
procedure record_representation_clause_3
(User_Data : in out WisiToken.Syntax_Trees.User_Data_Type'Class;
Tree : in out WisiToken.Syntax_Trees.Tree;
Nonterm : in WisiToken.Syntax_Trees.Valid_Node_Access);
procedure record_representation_clause_4
(User_Data : in out WisiToken.Syntax_Trees.User_Data_Type'Class;
Tree : in out WisiToken.Syntax_Trees.Tree;
Nonterm : in WisiToken.Syntax_Trees.Valid_Node_Access);
procedure record_representation_clause_5
(User_Data : in out WisiToken.Syntax_Trees.User_Data_Type'Class;
Tree : in out WisiToken.Syntax_Trees.Tree;
Nonterm : in WisiToken.Syntax_Trees.Valid_Node_Access);
procedure record_representation_clause_6
(User_Data : in out WisiToken.Syntax_Trees.User_Data_Type'Class;
Tree : in out WisiToken.Syntax_Trees.Tree;
Nonterm : in WisiToken.Syntax_Trees.Valid_Node_Access);
procedure record_representation_clause_7
(User_Data : in out WisiToken.Syntax_Trees.User_Data_Type'Class;
Tree : in out WisiToken.Syntax_Trees.Tree;
Nonterm : in WisiToken.Syntax_Trees.Valid_Node_Access);
procedure component_clause_0
(User_Data : in out WisiToken.Syntax_Trees.User_Data_Type'Class;
Tree : in out WisiToken.Syntax_Trees.Tree;
Nonterm : in WisiToken.Syntax_Trees.Valid_Node_Access);
procedure delta_constraint_0
(User_Data : in out WisiToken.Syntax_Trees.User_Data_Type'Class;
Tree : in out WisiToken.Syntax_Trees.Tree;
Nonterm : in WisiToken.Syntax_Trees.Valid_Node_Access);
procedure delta_constraint_1
(User_Data : in out WisiToken.Syntax_Trees.User_Data_Type'Class;
Tree : in out WisiToken.Syntax_Trees.Tree;
Nonterm : in WisiToken.Syntax_Trees.Valid_Node_Access);
procedure at_clause_0
(User_Data : in out WisiToken.Syntax_Trees.User_Data_Type'Class;
Tree : in out WisiToken.Syntax_Trees.Tree;
Nonterm : in WisiToken.Syntax_Trees.Valid_Node_Access);
function name_0_check
(Tree : in WisiToken.Syntax_Trees.Tree;
Nonterm : in out WisiToken.Syntax_Trees.Recover_Token;
Tokens : in WisiToken.Syntax_Trees.Recover_Token_Array;
Recover_Active : in Boolean)
return WisiToken.Syntax_Trees.In_Parse_Actions.Status;
function name_3_check
(Tree : in WisiToken.Syntax_Trees.Tree;
Nonterm : in out WisiToken.Syntax_Trees.Recover_Token;
Tokens : in WisiToken.Syntax_Trees.Recover_Token_Array;
Recover_Active : in Boolean)
return WisiToken.Syntax_Trees.In_Parse_Actions.Status;
function direct_name_0_check
(Tree : in WisiToken.Syntax_Trees.Tree;
Nonterm : in out WisiToken.Syntax_Trees.Recover_Token;
Tokens : in WisiToken.Syntax_Trees.Recover_Token_Array;
Recover_Active : in Boolean)
return WisiToken.Syntax_Trees.In_Parse_Actions.Status;
function direct_name_1_check
(Tree : in WisiToken.Syntax_Trees.Tree;
Nonterm : in out WisiToken.Syntax_Trees.Recover_Token;
Tokens : in WisiToken.Syntax_Trees.Recover_Token_Array;
Recover_Active : in Boolean)
return WisiToken.Syntax_Trees.In_Parse_Actions.Status;
function selected_component_0_check
(Tree : in WisiToken.Syntax_Trees.Tree;
Nonterm : in out WisiToken.Syntax_Trees.Recover_Token;
Tokens : in WisiToken.Syntax_Trees.Recover_Token_Array;
Recover_Active : in Boolean)
return WisiToken.Syntax_Trees.In_Parse_Actions.Status;
function loop_statement_0_check
(Tree : in WisiToken.Syntax_Trees.Tree;
Nonterm : in out WisiToken.Syntax_Trees.Recover_Token;
Tokens : in WisiToken.Syntax_Trees.Recover_Token_Array;
Recover_Active : in Boolean)
return WisiToken.Syntax_Trees.In_Parse_Actions.Status;
function loop_statement_1_check
(Tree : in WisiToken.Syntax_Trees.Tree;
Nonterm : in out WisiToken.Syntax_Trees.Recover_Token;
Tokens : in WisiToken.Syntax_Trees.Recover_Token_Array;
Recover_Active : in Boolean)
return WisiToken.Syntax_Trees.In_Parse_Actions.Status;
function label_opt_0_check
(Tree : in WisiToken.Syntax_Trees.Tree;
Nonterm : in out WisiToken.Syntax_Trees.Recover_Token;
Tokens : in WisiToken.Syntax_Trees.Recover_Token_Array;
Recover_Active : in Boolean)
return WisiToken.Syntax_Trees.In_Parse_Actions.Status;
function block_statement_0_check
(Tree : in WisiToken.Syntax_Trees.Tree;
Nonterm : in out WisiToken.Syntax_Trees.Recover_Token;
Tokens : in WisiToken.Syntax_Trees.Recover_Token_Array;
Recover_Active : in Boolean)
return WisiToken.Syntax_Trees.In_Parse_Actions.Status;
function block_statement_1_check
(Tree : in WisiToken.Syntax_Trees.Tree;
Nonterm : in out WisiToken.Syntax_Trees.Recover_Token;
Tokens : in WisiToken.Syntax_Trees.Recover_Token_Array;
Recover_Active : in Boolean)
return WisiToken.Syntax_Trees.In_Parse_Actions.Status;
function subprogram_specification_0_check
(Tree : in WisiToken.Syntax_Trees.Tree;
Nonterm : in out WisiToken.Syntax_Trees.Recover_Token;
Tokens : in WisiToken.Syntax_Trees.Recover_Token_Array;
Recover_Active : in Boolean)
return WisiToken.Syntax_Trees.In_Parse_Actions.Status;
function subprogram_specification_1_check
(Tree : in WisiToken.Syntax_Trees.Tree;
Nonterm : in out WisiToken.Syntax_Trees.Recover_Token;
Tokens : in WisiToken.Syntax_Trees.Recover_Token_Array;
Recover_Active : in Boolean)
return WisiToken.Syntax_Trees.In_Parse_Actions.Status;
function procedure_specification_0_check
(Tree : in WisiToken.Syntax_Trees.Tree;
Nonterm : in out WisiToken.Syntax_Trees.Recover_Token;
Tokens : in WisiToken.Syntax_Trees.Recover_Token_Array;
Recover_Active : in Boolean)
return WisiToken.Syntax_Trees.In_Parse_Actions.Status;
function function_specification_0_check
(Tree : in WisiToken.Syntax_Trees.Tree;
Nonterm : in out WisiToken.Syntax_Trees.Recover_Token;
Tokens : in WisiToken.Syntax_Trees.Recover_Token_Array;
Recover_Active : in Boolean)
return WisiToken.Syntax_Trees.In_Parse_Actions.Status;
function name_opt_0_check
(Tree : in WisiToken.Syntax_Trees.Tree;
Nonterm : in out WisiToken.Syntax_Trees.Recover_Token;
Tokens : in WisiToken.Syntax_Trees.Recover_Token_Array;
Recover_Active : in Boolean)
return WisiToken.Syntax_Trees.In_Parse_Actions.Status;
function subprogram_body_0_check
(Tree : in WisiToken.Syntax_Trees.Tree;
Nonterm : in out WisiToken.Syntax_Trees.Recover_Token;
Tokens : in WisiToken.Syntax_Trees.Recover_Token_Array;
Recover_Active : in Boolean)
return WisiToken.Syntax_Trees.In_Parse_Actions.Status;
function subprogram_body_1_check
(Tree : in WisiToken.Syntax_Trees.Tree;
Nonterm : in out WisiToken.Syntax_Trees.Recover_Token;
Tokens : in WisiToken.Syntax_Trees.Recover_Token_Array;
Recover_Active : in Boolean)
return WisiToken.Syntax_Trees.In_Parse_Actions.Status;
function subprogram_body_2_check
(Tree : in WisiToken.Syntax_Trees.Tree;
Nonterm : in out WisiToken.Syntax_Trees.Recover_Token;
Tokens : in WisiToken.Syntax_Trees.Recover_Token_Array;
Recover_Active : in Boolean)
return WisiToken.Syntax_Trees.In_Parse_Actions.Status;
function subprogram_body_3_check
(Tree : in WisiToken.Syntax_Trees.Tree;
Nonterm : in out WisiToken.Syntax_Trees.Recover_Token;
Tokens : in WisiToken.Syntax_Trees.Recover_Token_Array;
Recover_Active : in Boolean)
return WisiToken.Syntax_Trees.In_Parse_Actions.Status;
function package_specification_0_check
(Tree : in WisiToken.Syntax_Trees.Tree;
Nonterm : in out WisiToken.Syntax_Trees.Recover_Token;
Tokens : in WisiToken.Syntax_Trees.Recover_Token_Array;
Recover_Active : in Boolean)
return WisiToken.Syntax_Trees.In_Parse_Actions.Status;
function package_specification_1_check
(Tree : in WisiToken.Syntax_Trees.Tree;
Nonterm : in out WisiToken.Syntax_Trees.Recover_Token;
Tokens : in WisiToken.Syntax_Trees.Recover_Token_Array;
Recover_Active : in Boolean)
return WisiToken.Syntax_Trees.In_Parse_Actions.Status;
function package_specification_2_check
(Tree : in WisiToken.Syntax_Trees.Tree;
Nonterm : in out WisiToken.Syntax_Trees.Recover_Token;
Tokens : in WisiToken.Syntax_Trees.Recover_Token_Array;
Recover_Active : in Boolean)
return WisiToken.Syntax_Trees.In_Parse_Actions.Status;
function package_specification_3_check
(Tree : in WisiToken.Syntax_Trees.Tree;
Nonterm : in out WisiToken.Syntax_Trees.Recover_Token;
Tokens : in WisiToken.Syntax_Trees.Recover_Token_Array;
Recover_Active : in Boolean)
return WisiToken.Syntax_Trees.In_Parse_Actions.Status;
function package_specification_4_check
(Tree : in WisiToken.Syntax_Trees.Tree;
Nonterm : in out WisiToken.Syntax_Trees.Recover_Token;
Tokens : in WisiToken.Syntax_Trees.Recover_Token_Array;
Recover_Active : in Boolean)
return WisiToken.Syntax_Trees.In_Parse_Actions.Status;
function package_specification_5_check
(Tree : in WisiToken.Syntax_Trees.Tree;
Nonterm : in out WisiToken.Syntax_Trees.Recover_Token;
Tokens : in WisiToken.Syntax_Trees.Recover_Token_Array;
Recover_Active : in Boolean)
return WisiToken.Syntax_Trees.In_Parse_Actions.Status;
function package_specification_6_check
(Tree : in WisiToken.Syntax_Trees.Tree;
Nonterm : in out WisiToken.Syntax_Trees.Recover_Token;
Tokens : in WisiToken.Syntax_Trees.Recover_Token_Array;
Recover_Active : in Boolean)
return WisiToken.Syntax_Trees.In_Parse_Actions.Status;
function package_specification_7_check
(Tree : in WisiToken.Syntax_Trees.Tree;
Nonterm : in out WisiToken.Syntax_Trees.Recover_Token;
Tokens : in WisiToken.Syntax_Trees.Recover_Token_Array;
Recover_Active : in Boolean)
return WisiToken.Syntax_Trees.In_Parse_Actions.Status;
function package_specification_8_check
(Tree : in WisiToken.Syntax_Trees.Tree;
Nonterm : in out WisiToken.Syntax_Trees.Recover_Token;
Tokens : in WisiToken.Syntax_Trees.Recover_Token_Array;
Recover_Active : in Boolean)
return WisiToken.Syntax_Trees.In_Parse_Actions.Status;
function package_specification_9_check
(Tree : in WisiToken.Syntax_Trees.Tree;
Nonterm : in out WisiToken.Syntax_Trees.Recover_Token;
Tokens : in WisiToken.Syntax_Trees.Recover_Token_Array;
Recover_Active : in Boolean)
return WisiToken.Syntax_Trees.In_Parse_Actions.Status;
function package_specification_10_check
(Tree : in WisiToken.Syntax_Trees.Tree;
Nonterm : in out WisiToken.Syntax_Trees.Recover_Token;
Tokens : in WisiToken.Syntax_Trees.Recover_Token_Array;
Recover_Active : in Boolean)
return WisiToken.Syntax_Trees.In_Parse_Actions.Status;
function package_specification_11_check
(Tree : in WisiToken.Syntax_Trees.Tree;
Nonterm : in out WisiToken.Syntax_Trees.Recover_Token;
Tokens : in WisiToken.Syntax_Trees.Recover_Token_Array;
Recover_Active : in Boolean)
return WisiToken.Syntax_Trees.In_Parse_Actions.Status;
function package_body_0_check
(Tree : in WisiToken.Syntax_Trees.Tree;
Nonterm : in out WisiToken.Syntax_Trees.Recover_Token;
Tokens : in WisiToken.Syntax_Trees.Recover_Token_Array;
Recover_Active : in Boolean)
return WisiToken.Syntax_Trees.In_Parse_Actions.Status;
function package_body_1_check
(Tree : in WisiToken.Syntax_Trees.Tree;
Nonterm : in out WisiToken.Syntax_Trees.Recover_Token;
Tokens : in WisiToken.Syntax_Trees.Recover_Token_Array;
Recover_Active : in Boolean)
return WisiToken.Syntax_Trees.In_Parse_Actions.Status;
function package_body_2_check
(Tree : in WisiToken.Syntax_Trees.Tree;
Nonterm : in out WisiToken.Syntax_Trees.Recover_Token;
Tokens : in WisiToken.Syntax_Trees.Recover_Token_Array;
Recover_Active : in Boolean)
return WisiToken.Syntax_Trees.In_Parse_Actions.Status;
function package_body_3_check
(Tree : in WisiToken.Syntax_Trees.Tree;
Nonterm : in out WisiToken.Syntax_Trees.Recover_Token;
Tokens : in WisiToken.Syntax_Trees.Recover_Token_Array;
Recover_Active : in Boolean)
return WisiToken.Syntax_Trees.In_Parse_Actions.Status;
function task_type_declaration_0_check
(Tree : in WisiToken.Syntax_Trees.Tree;
Nonterm : in out WisiToken.Syntax_Trees.Recover_Token;
Tokens : in WisiToken.Syntax_Trees.Recover_Token_Array;
Recover_Active : in Boolean)
return WisiToken.Syntax_Trees.In_Parse_Actions.Status;
function task_type_declaration_1_check
(Tree : in WisiToken.Syntax_Trees.Tree;
Nonterm : in out WisiToken.Syntax_Trees.Recover_Token;
Tokens : in WisiToken.Syntax_Trees.Recover_Token_Array;
Recover_Active : in Boolean)
return WisiToken.Syntax_Trees.In_Parse_Actions.Status;
function task_type_declaration_3_check
(Tree : in WisiToken.Syntax_Trees.Tree;
Nonterm : in out WisiToken.Syntax_Trees.Recover_Token;
Tokens : in WisiToken.Syntax_Trees.Recover_Token_Array;
Recover_Active : in Boolean)
return WisiToken.Syntax_Trees.In_Parse_Actions.Status;
function task_type_declaration_4_check
(Tree : in WisiToken.Syntax_Trees.Tree;
Nonterm : in out WisiToken.Syntax_Trees.Recover_Token;
Tokens : in WisiToken.Syntax_Trees.Recover_Token_Array;
Recover_Active : in Boolean)
return WisiToken.Syntax_Trees.In_Parse_Actions.Status;
function task_type_declaration_6_check
(Tree : in WisiToken.Syntax_Trees.Tree;
Nonterm : in out WisiToken.Syntax_Trees.Recover_Token;
Tokens : in WisiToken.Syntax_Trees.Recover_Token_Array;
Recover_Active : in Boolean)
return WisiToken.Syntax_Trees.In_Parse_Actions.Status;
function task_type_declaration_7_check
(Tree : in WisiToken.Syntax_Trees.Tree;
Nonterm : in out WisiToken.Syntax_Trees.Recover_Token;
Tokens : in WisiToken.Syntax_Trees.Recover_Token_Array;
Recover_Active : in Boolean)
return WisiToken.Syntax_Trees.In_Parse_Actions.Status;
function task_type_declaration_9_check
(Tree : in WisiToken.Syntax_Trees.Tree;
Nonterm : in out WisiToken.Syntax_Trees.Recover_Token;
Tokens : in WisiToken.Syntax_Trees.Recover_Token_Array;
Recover_Active : in Boolean)
return WisiToken.Syntax_Trees.In_Parse_Actions.Status;
function task_type_declaration_10_check
(Tree : in WisiToken.Syntax_Trees.Tree;
Nonterm : in out WisiToken.Syntax_Trees.Recover_Token;
Tokens : in WisiToken.Syntax_Trees.Recover_Token_Array;
Recover_Active : in Boolean)
return WisiToken.Syntax_Trees.In_Parse_Actions.Status;
function single_task_declaration_0_check
(Tree : in WisiToken.Syntax_Trees.Tree;
Nonterm : in out WisiToken.Syntax_Trees.Recover_Token;
Tokens : in WisiToken.Syntax_Trees.Recover_Token_Array;
Recover_Active : in Boolean)
return WisiToken.Syntax_Trees.In_Parse_Actions.Status;
function single_task_declaration_1_check
(Tree : in WisiToken.Syntax_Trees.Tree;
Nonterm : in out WisiToken.Syntax_Trees.Recover_Token;
Tokens : in WisiToken.Syntax_Trees.Recover_Token_Array;
Recover_Active : in Boolean)
return WisiToken.Syntax_Trees.In_Parse_Actions.Status;
function single_task_declaration_3_check
(Tree : in WisiToken.Syntax_Trees.Tree;
Nonterm : in out WisiToken.Syntax_Trees.Recover_Token;
Tokens : in WisiToken.Syntax_Trees.Recover_Token_Array;
Recover_Active : in Boolean)
return WisiToken.Syntax_Trees.In_Parse_Actions.Status;
function single_task_declaration_4_check
(Tree : in WisiToken.Syntax_Trees.Tree;
Nonterm : in out WisiToken.Syntax_Trees.Recover_Token;
Tokens : in WisiToken.Syntax_Trees.Recover_Token_Array;
Recover_Active : in Boolean)
return WisiToken.Syntax_Trees.In_Parse_Actions.Status;
function task_definition_0_check
(Tree : in WisiToken.Syntax_Trees.Tree;
Nonterm : in out WisiToken.Syntax_Trees.Recover_Token;
Tokens : in WisiToken.Syntax_Trees.Recover_Token_Array;
Recover_Active : in Boolean)
return WisiToken.Syntax_Trees.In_Parse_Actions.Status;
function task_definition_1_check
(Tree : in WisiToken.Syntax_Trees.Tree;
Nonterm : in out WisiToken.Syntax_Trees.Recover_Token;
Tokens : in WisiToken.Syntax_Trees.Recover_Token_Array;
Recover_Active : in Boolean)
return WisiToken.Syntax_Trees.In_Parse_Actions.Status;
function task_body_0_check
(Tree : in WisiToken.Syntax_Trees.Tree;
Nonterm : in out WisiToken.Syntax_Trees.Recover_Token;
Tokens : in WisiToken.Syntax_Trees.Recover_Token_Array;
Recover_Active : in Boolean)
return WisiToken.Syntax_Trees.In_Parse_Actions.Status;
function task_body_1_check
(Tree : in WisiToken.Syntax_Trees.Tree;
Nonterm : in out WisiToken.Syntax_Trees.Recover_Token;
Tokens : in WisiToken.Syntax_Trees.Recover_Token_Array;
Recover_Active : in Boolean)
return WisiToken.Syntax_Trees.In_Parse_Actions.Status;
function protected_type_declaration_0_check
(Tree : in WisiToken.Syntax_Trees.Tree;
Nonterm : in out WisiToken.Syntax_Trees.Recover_Token;
Tokens : in WisiToken.Syntax_Trees.Recover_Token_Array;
Recover_Active : in Boolean)
return WisiToken.Syntax_Trees.In_Parse_Actions.Status;
function protected_type_declaration_1_check
(Tree : in WisiToken.Syntax_Trees.Tree;
Nonterm : in out WisiToken.Syntax_Trees.Recover_Token;
Tokens : in WisiToken.Syntax_Trees.Recover_Token_Array;
Recover_Active : in Boolean)
return WisiToken.Syntax_Trees.In_Parse_Actions.Status;
function protected_type_declaration_2_check
(Tree : in WisiToken.Syntax_Trees.Tree;
Nonterm : in out WisiToken.Syntax_Trees.Recover_Token;
Tokens : in WisiToken.Syntax_Trees.Recover_Token_Array;
Recover_Active : in Boolean)
return WisiToken.Syntax_Trees.In_Parse_Actions.Status;
function protected_type_declaration_3_check
(Tree : in WisiToken.Syntax_Trees.Tree;
Nonterm : in out WisiToken.Syntax_Trees.Recover_Token;
Tokens : in WisiToken.Syntax_Trees.Recover_Token_Array;
Recover_Active : in Boolean)
return WisiToken.Syntax_Trees.In_Parse_Actions.Status;
function protected_type_declaration_4_check
(Tree : in WisiToken.Syntax_Trees.Tree;
Nonterm : in out WisiToken.Syntax_Trees.Recover_Token;
Tokens : in WisiToken.Syntax_Trees.Recover_Token_Array;
Recover_Active : in Boolean)
return WisiToken.Syntax_Trees.In_Parse_Actions.Status;
function protected_type_declaration_5_check
(Tree : in WisiToken.Syntax_Trees.Tree;
Nonterm : in out WisiToken.Syntax_Trees.Recover_Token;
Tokens : in WisiToken.Syntax_Trees.Recover_Token_Array;
Recover_Active : in Boolean)
return WisiToken.Syntax_Trees.In_Parse_Actions.Status;
function protected_type_declaration_6_check
(Tree : in WisiToken.Syntax_Trees.Tree;
Nonterm : in out WisiToken.Syntax_Trees.Recover_Token;
Tokens : in WisiToken.Syntax_Trees.Recover_Token_Array;
Recover_Active : in Boolean)
return WisiToken.Syntax_Trees.In_Parse_Actions.Status;
function protected_type_declaration_7_check
(Tree : in WisiToken.Syntax_Trees.Tree;
Nonterm : in out WisiToken.Syntax_Trees.Recover_Token;
Tokens : in WisiToken.Syntax_Trees.Recover_Token_Array;
Recover_Active : in Boolean)
return WisiToken.Syntax_Trees.In_Parse_Actions.Status;
function single_protected_declaration_0_check
(Tree : in WisiToken.Syntax_Trees.Tree;
Nonterm : in out WisiToken.Syntax_Trees.Recover_Token;
Tokens : in WisiToken.Syntax_Trees.Recover_Token_Array;
Recover_Active : in Boolean)
return WisiToken.Syntax_Trees.In_Parse_Actions.Status;
function single_protected_declaration_1_check
(Tree : in WisiToken.Syntax_Trees.Tree;
Nonterm : in out WisiToken.Syntax_Trees.Recover_Token;
Tokens : in WisiToken.Syntax_Trees.Recover_Token_Array;
Recover_Active : in Boolean)
return WisiToken.Syntax_Trees.In_Parse_Actions.Status;
function single_protected_declaration_2_check
(Tree : in WisiToken.Syntax_Trees.Tree;
Nonterm : in out WisiToken.Syntax_Trees.Recover_Token;
Tokens : in WisiToken.Syntax_Trees.Recover_Token_Array;
Recover_Active : in Boolean)
return WisiToken.Syntax_Trees.In_Parse_Actions.Status;
function single_protected_declaration_3_check
(Tree : in WisiToken.Syntax_Trees.Tree;
Nonterm : in out WisiToken.Syntax_Trees.Recover_Token;
Tokens : in WisiToken.Syntax_Trees.Recover_Token_Array;
Recover_Active : in Boolean)
return WisiToken.Syntax_Trees.In_Parse_Actions.Status;
function protected_definition_0_check
(Tree : in WisiToken.Syntax_Trees.Tree;
Nonterm : in out WisiToken.Syntax_Trees.Recover_Token;
Tokens : in WisiToken.Syntax_Trees.Recover_Token_Array;
Recover_Active : in Boolean)
return WisiToken.Syntax_Trees.In_Parse_Actions.Status;
function protected_definition_2_check
(Tree : in WisiToken.Syntax_Trees.Tree;
Nonterm : in out WisiToken.Syntax_Trees.Recover_Token;
Tokens : in WisiToken.Syntax_Trees.Recover_Token_Array;
Recover_Active : in Boolean)
return WisiToken.Syntax_Trees.In_Parse_Actions.Status;
function protected_definition_4_check
(Tree : in WisiToken.Syntax_Trees.Tree;
Nonterm : in out WisiToken.Syntax_Trees.Recover_Token;
Tokens : in WisiToken.Syntax_Trees.Recover_Token_Array;
Recover_Active : in Boolean)
return WisiToken.Syntax_Trees.In_Parse_Actions.Status;
function protected_definition_6_check
(Tree : in WisiToken.Syntax_Trees.Tree;
Nonterm : in out WisiToken.Syntax_Trees.Recover_Token;
Tokens : in WisiToken.Syntax_Trees.Recover_Token_Array;
Recover_Active : in Boolean)
return WisiToken.Syntax_Trees.In_Parse_Actions.Status;
function protected_definition_8_check
(Tree : in WisiToken.Syntax_Trees.Tree;
Nonterm : in out WisiToken.Syntax_Trees.Recover_Token;
Tokens : in WisiToken.Syntax_Trees.Recover_Token_Array;
Recover_Active : in Boolean)
return WisiToken.Syntax_Trees.In_Parse_Actions.Status;
function protected_definition_10_check
(Tree : in WisiToken.Syntax_Trees.Tree;
Nonterm : in out WisiToken.Syntax_Trees.Recover_Token;
Tokens : in WisiToken.Syntax_Trees.Recover_Token_Array;
Recover_Active : in Boolean)
return WisiToken.Syntax_Trees.In_Parse_Actions.Status;
function protected_body_0_check
(Tree : in WisiToken.Syntax_Trees.Tree;
Nonterm : in out WisiToken.Syntax_Trees.Recover_Token;
Tokens : in WisiToken.Syntax_Trees.Recover_Token_Array;
Recover_Active : in Boolean)
return WisiToken.Syntax_Trees.In_Parse_Actions.Status;
function protected_body_1_check
(Tree : in WisiToken.Syntax_Trees.Tree;
Nonterm : in out WisiToken.Syntax_Trees.Recover_Token;
Tokens : in WisiToken.Syntax_Trees.Recover_Token_Array;
Recover_Active : in Boolean)
return WisiToken.Syntax_Trees.In_Parse_Actions.Status;
function protected_body_2_check
(Tree : in WisiToken.Syntax_Trees.Tree;
Nonterm : in out WisiToken.Syntax_Trees.Recover_Token;
Tokens : in WisiToken.Syntax_Trees.Recover_Token_Array;
Recover_Active : in Boolean)
return WisiToken.Syntax_Trees.In_Parse_Actions.Status;
function protected_body_3_check
(Tree : in WisiToken.Syntax_Trees.Tree;
Nonterm : in out WisiToken.Syntax_Trees.Recover_Token;
Tokens : in WisiToken.Syntax_Trees.Recover_Token_Array;
Recover_Active : in Boolean)
return WisiToken.Syntax_Trees.In_Parse_Actions.Status;
function accept_statement_0_check
(Tree : in WisiToken.Syntax_Trees.Tree;
Nonterm : in out WisiToken.Syntax_Trees.Recover_Token;
Tokens : in WisiToken.Syntax_Trees.Recover_Token_Array;
Recover_Active : in Boolean)
return WisiToken.Syntax_Trees.In_Parse_Actions.Status;
function accept_statement_2_check
(Tree : in WisiToken.Syntax_Trees.Tree;
Nonterm : in out WisiToken.Syntax_Trees.Recover_Token;
Tokens : in WisiToken.Syntax_Trees.Recover_Token_Array;
Recover_Active : in Boolean)
return WisiToken.Syntax_Trees.In_Parse_Actions.Status;
function entry_body_0_check
(Tree : in WisiToken.Syntax_Trees.Tree;
Nonterm : in out WisiToken.Syntax_Trees.Recover_Token;
Tokens : in WisiToken.Syntax_Trees.Recover_Token_Array;
Recover_Active : in Boolean)
return WisiToken.Syntax_Trees.In_Parse_Actions.Status;
function entry_body_1_check
(Tree : in WisiToken.Syntax_Trees.Tree;
Nonterm : in out WisiToken.Syntax_Trees.Recover_Token;
Tokens : in WisiToken.Syntax_Trees.Recover_Token_Array;
Recover_Active : in Boolean)
return WisiToken.Syntax_Trees.In_Parse_Actions.Status;
function compilation_0_check
(Tree : in WisiToken.Syntax_Trees.Tree;
Nonterm : in out WisiToken.Syntax_Trees.Recover_Token;
Tokens : in WisiToken.Syntax_Trees.Recover_Token_Array;
Recover_Active : in Boolean)
return WisiToken.Syntax_Trees.In_Parse_Actions.Status;
Partial_Parse_Active : aliased Boolean := False;
Partial_Parse_Byte_Goal : aliased WisiToken.Buffer_Pos := WisiToken.Buffer_Pos'Last;
end Ada_Annex_P_Process_Actions;
|
reznikmm/matreshka | Ada | 63,880 | ads | ------------------------------------------------------------------------------
-- --
-- Matreshka Project --
-- --
-- Ada Modeling Framework --
-- --
-- Runtime Library Component --
-- --
------------------------------------------------------------------------------
-- --
-- Copyright © 2012-2013, Vadim Godunko <[email protected]> --
-- All rights reserved. --
-- --
-- Redistribution and use in source and binary forms, with or without --
-- modification, are permitted provided that the following conditions --
-- are met: --
-- --
-- * Redistributions of source code must retain the above copyright --
-- notice, this list of conditions and the following disclaimer. --
-- --
-- * Redistributions in binary form must reproduce the above copyright --
-- notice, this list of conditions and the following disclaimer in the --
-- documentation and/or other materials provided with the distribution. --
-- --
-- * Neither the name of the Vadim Godunko, IE nor the names of its --
-- contributors may be used to endorse or promote products derived from --
-- this software without specific prior written permission. --
-- --
-- THIS SOFTWARE IS PROVIDED BY THE COPYRIGHT HOLDERS AND CONTRIBUTORS --
-- "AS IS" AND ANY EXPRESS OR IMPLIED WARRANTIES, INCLUDING, BUT NOT --
-- LIMITED TO, THE IMPLIED WARRANTIES OF MERCHANTABILITY AND FITNESS FOR --
-- A PARTICULAR PURPOSE ARE DISCLAIMED. IN NO EVENT SHALL THE COPYRIGHT --
-- HOLDER OR CONTRIBUTORS BE LIABLE FOR ANY DIRECT, INDIRECT, INCIDENTAL, --
-- SPECIAL, EXEMPLARY, OR CONSEQUENTIAL DAMAGES (INCLUDING, BUT NOT LIMITED --
-- TO, PROCUREMENT OF SUBSTITUTE GOODS OR SERVICES; LOSS OF USE, DATA, OR --
-- PROFITS; OR BUSINESS INTERRUPTION) HOWEVER CAUSED AND ON ANY THEORY OF --
-- LIABILITY, WHETHER IN CONTRACT, STRICT LIABILITY, OR TORT (INCLUDING --
-- NEGLIGENCE OR OTHERWISE) ARISING IN ANY WAY OUT OF THE USE OF THIS --
-- SOFTWARE, EVEN IF ADVISED OF THE POSSIBILITY OF SUCH DAMAGE. --
-- --
------------------------------------------------------------------------------
-- $Revision$ $Date$
------------------------------------------------------------------------------
-- This file is generated, don't edit it.
------------------------------------------------------------------------------
with AMF.Internals.Tables.OCL_Types;
package AMF.Internals.Tables.OCL_Attribute_Mappings is
pragma Preelaborate;
OCL_Collection_Offset : constant
array (AMF.Internals.Tables.OCL_Types.Element_Kinds,
AMF.Internals.CMOF_Element range 48 .. 54)
of AMF.Internals.AMF_Collection_Of_Element :=
(AMF.Internals.Tables.OCL_Types.E_None =>
(others => 0),
AMF.Internals.Tables.OCL_Types.E_OCL_Any_Type =>
(others => 0),
AMF.Internals.Tables.OCL_Types.E_OCL_Association_Class_Call_Exp =>
(52 => 4, -- NavigationCallExp::qualifier
others => 0),
AMF.Internals.Tables.OCL_Types.E_OCL_Bag_Type =>
(others => 0),
AMF.Internals.Tables.OCL_Types.E_OCL_Boolean_Literal_Exp =>
(others => 0),
AMF.Internals.Tables.OCL_Types.E_OCL_Collection_Item =>
(others => 0),
AMF.Internals.Tables.OCL_Types.E_OCL_Collection_Literal_Exp =>
(48 => 4, -- CollectionLiteralExp::part
others => 0),
AMF.Internals.Tables.OCL_Types.E_OCL_Collection_Range =>
(others => 0),
AMF.Internals.Tables.OCL_Types.E_OCL_Collection_Type =>
(others => 0),
AMF.Internals.Tables.OCL_Types.E_OCL_Enum_Literal_Exp =>
(others => 0),
AMF.Internals.Tables.OCL_Types.E_OCL_Expression_In_Ocl =>
(49 => 4, -- ExpressionInOcl::parameterVariable
others => 0),
AMF.Internals.Tables.OCL_Types.E_OCL_If_Exp =>
(others => 0),
AMF.Internals.Tables.OCL_Types.E_OCL_Integer_Literal_Exp =>
(others => 0),
AMF.Internals.Tables.OCL_Types.E_OCL_Invalid_Literal_Exp =>
(others => 0),
AMF.Internals.Tables.OCL_Types.E_OCL_Invalid_Type =>
(others => 0),
AMF.Internals.Tables.OCL_Types.E_OCL_Iterate_Exp =>
(50 => 4, -- LoopExp::iterator
others => 0),
AMF.Internals.Tables.OCL_Types.E_OCL_Iterator_Exp =>
(50 => 4, -- LoopExp::iterator
others => 0),
AMF.Internals.Tables.OCL_Types.E_OCL_Let_Exp =>
(others => 0),
AMF.Internals.Tables.OCL_Types.E_OCL_Message_Exp =>
(51 => 4, -- MessageExp::argument
others => 0),
AMF.Internals.Tables.OCL_Types.E_OCL_Message_Type =>
(others => 0),
AMF.Internals.Tables.OCL_Types.E_OCL_Null_Literal_Exp =>
(others => 0),
AMF.Internals.Tables.OCL_Types.E_OCL_Operation_Call_Exp =>
(53 => 4, -- OperationCallExp::argument
others => 0),
AMF.Internals.Tables.OCL_Types.E_OCL_Ordered_Set_Type =>
(others => 0),
AMF.Internals.Tables.OCL_Types.E_OCL_Property_Call_Exp =>
(52 => 4, -- NavigationCallExp::qualifier
others => 0),
AMF.Internals.Tables.OCL_Types.E_OCL_Real_Literal_Exp =>
(others => 0),
AMF.Internals.Tables.OCL_Types.E_OCL_Sequence_Type =>
(others => 0),
AMF.Internals.Tables.OCL_Types.E_OCL_Set_Type =>
(others => 0),
AMF.Internals.Tables.OCL_Types.E_OCL_State_Exp =>
(others => 0),
AMF.Internals.Tables.OCL_Types.E_OCL_String_Literal_Exp =>
(others => 0),
AMF.Internals.Tables.OCL_Types.E_OCL_Template_Parameter_Type =>
(others => 0),
AMF.Internals.Tables.OCL_Types.E_OCL_Tuple_Literal_Exp =>
(54 => 4, -- TupleLiteralExp::part
others => 0),
AMF.Internals.Tables.OCL_Types.E_OCL_Tuple_Literal_Part =>
(others => 0),
AMF.Internals.Tables.OCL_Types.E_OCL_Tuple_Type =>
(others => 0),
AMF.Internals.Tables.OCL_Types.E_OCL_Type_Exp =>
(others => 0),
AMF.Internals.Tables.OCL_Types.E_OCL_Unlimited_Natural_Literal_Exp =>
(others => 0),
AMF.Internals.Tables.OCL_Types.E_OCL_Unspecified_Value_Exp =>
(others => 0),
AMF.Internals.Tables.OCL_Types.E_OCL_Variable =>
(others => 0),
AMF.Internals.Tables.OCL_Types.E_OCL_Variable_Exp =>
(others => 0),
AMF.Internals.Tables.OCL_Types.E_OCL_Void_Type =>
(others => 0));
OCL_Member_Offset : constant
array (AMF.Internals.Tables.OCL_Types.Element_Kinds,
AMF.Internals.CMOF_Element range 55 .. 93) of Natural :=
(AMF.Internals.Tables.OCL_Types.E_None =>
(others => 0),
AMF.Internals.Tables.OCL_Types.E_OCL_Any_Type =>
(others => 0),
AMF.Internals.Tables.OCL_Types.E_OCL_Association_Class_Call_Exp =>
(81 => 9, -- NavigationCallExp::navigationSource
55 => 10, -- AssociationClassCallExp::referredAssociationClass
57 => 8, -- CallExp::source
others => 0),
AMF.Internals.Tables.OCL_Types.E_OCL_Bag_Type =>
(62 => 17, -- CollectionType::elementType
others => 0),
AMF.Internals.Tables.OCL_Types.E_OCL_Boolean_Literal_Exp =>
(56 => 8, -- BooleanLiteralExp::booleanSymbol
others => 0),
AMF.Internals.Tables.OCL_Types.E_OCL_Collection_Item =>
(58 => 8, -- CollectionItem::item
others => 0),
AMF.Internals.Tables.OCL_Types.E_OCL_Collection_Literal_Exp =>
(59 => 8, -- CollectionLiteralExp::kind
others => 0),
AMF.Internals.Tables.OCL_Types.E_OCL_Collection_Range =>
(60 => 8, -- CollectionRange::first
61 => 9, -- CollectionRange::last
others => 0),
AMF.Internals.Tables.OCL_Types.E_OCL_Collection_Type =>
(62 => 17, -- CollectionType::elementType
others => 0),
AMF.Internals.Tables.OCL_Types.E_OCL_Enum_Literal_Exp =>
(63 => 8, -- EnumLiteralExp::referredEnumLiteral
others => 0),
AMF.Internals.Tables.OCL_Types.E_OCL_Expression_In_Ocl =>
(64 => 14, -- ExpressionInOcl::bodyExpression
65 => 15, -- ExpressionInOcl::contextVariable
66 => 17, -- ExpressionInOcl::generatedType
67 => 16, -- ExpressionInOcl::resultVariable
others => 0),
AMF.Internals.Tables.OCL_Types.E_OCL_If_Exp =>
(68 => 8, -- IfExp::condition
69 => 10, -- IfExp::elseExpression
70 => 9, -- IfExp::thenExpression
others => 0),
AMF.Internals.Tables.OCL_Types.E_OCL_Integer_Literal_Exp =>
(71 => 8, -- IntegerLiteralExp::integerSymbol
others => 0),
AMF.Internals.Tables.OCL_Types.E_OCL_Invalid_Literal_Exp =>
(others => 0),
AMF.Internals.Tables.OCL_Types.E_OCL_Invalid_Type =>
(others => 0),
AMF.Internals.Tables.OCL_Types.E_OCL_Iterate_Exp =>
(75 => 9, -- LoopExp::body
72 => 10, -- IterateExp::result
57 => 8, -- CallExp::source
others => 0),
AMF.Internals.Tables.OCL_Types.E_OCL_Iterator_Exp =>
(75 => 9, -- LoopExp::body
57 => 8, -- CallExp::source
others => 0),
AMF.Internals.Tables.OCL_Types.E_OCL_Let_Exp =>
(73 => 8, -- LetExp::in
74 => 9, -- LetExp::variable
others => 0),
AMF.Internals.Tables.OCL_Types.E_OCL_Message_Exp =>
(76 => 9, -- MessageExp::calledOperation
77 => 10, -- MessageExp::sentSignal
78 => 8, -- MessageExp::target
others => 0),
AMF.Internals.Tables.OCL_Types.E_OCL_Message_Type =>
(79 => 18, -- MessageType::referredOperation
80 => 17, -- MessageType::referredSignal
others => 0),
AMF.Internals.Tables.OCL_Types.E_OCL_Null_Literal_Exp =>
(others => 0),
AMF.Internals.Tables.OCL_Types.E_OCL_Operation_Call_Exp =>
(82 => 9, -- OperationCallExp::referredOperation
57 => 8, -- CallExp::source
others => 0),
AMF.Internals.Tables.OCL_Types.E_OCL_Ordered_Set_Type =>
(62 => 17, -- CollectionType::elementType
others => 0),
AMF.Internals.Tables.OCL_Types.E_OCL_Property_Call_Exp =>
(81 => 9, -- NavigationCallExp::navigationSource
83 => 10, -- PropertyCallExp::referredProperty
57 => 8, -- CallExp::source
others => 0),
AMF.Internals.Tables.OCL_Types.E_OCL_Real_Literal_Exp =>
(84 => 8, -- RealLiteralExp::realSymbol
others => 0),
AMF.Internals.Tables.OCL_Types.E_OCL_Sequence_Type =>
(62 => 17, -- CollectionType::elementType
others => 0),
AMF.Internals.Tables.OCL_Types.E_OCL_Set_Type =>
(62 => 17, -- CollectionType::elementType
others => 0),
AMF.Internals.Tables.OCL_Types.E_OCL_State_Exp =>
(85 => 8, -- StateExp::referredState
others => 0),
AMF.Internals.Tables.OCL_Types.E_OCL_String_Literal_Exp =>
(86 => 8, -- StringLiteralExp::stringSymbol
others => 0),
AMF.Internals.Tables.OCL_Types.E_OCL_Template_Parameter_Type =>
(87 => 17, -- TemplateParameterType::specification
others => 0),
AMF.Internals.Tables.OCL_Types.E_OCL_Tuple_Literal_Exp =>
(others => 0),
AMF.Internals.Tables.OCL_Types.E_OCL_Tuple_Literal_Part =>
(88 => 8, -- TupleLiteralPart::attribute
others => 0),
AMF.Internals.Tables.OCL_Types.E_OCL_Tuple_Type =>
(others => 0),
AMF.Internals.Tables.OCL_Types.E_OCL_Type_Exp =>
(89 => 8, -- TypeExp::referredType
others => 0),
AMF.Internals.Tables.OCL_Types.E_OCL_Unlimited_Natural_Literal_Exp =>
(90 => 8, -- UnlimitedNaturalLiteralExp::unlimitedNaturalSymbol
others => 0),
AMF.Internals.Tables.OCL_Types.E_OCL_Unspecified_Value_Exp =>
(others => 0),
AMF.Internals.Tables.OCL_Types.E_OCL_Variable =>
(91 => 8, -- Variable::initExpression
92 => 9, -- Variable::representedParameter
others => 0),
AMF.Internals.Tables.OCL_Types.E_OCL_Variable_Exp =>
(93 => 8, -- VariableExp::referredVariable
others => 0),
AMF.Internals.Tables.OCL_Types.E_OCL_Void_Type =>
(others => 0));
UML_Collection_Offset : constant
array (AMF.Internals.Tables.OCL_Types.Element_Kinds,
AMF.Internals.CMOF_Element range 243 .. 482)
of AMF.Internals.AMF_Collection_Of_Element :=
(AMF.Internals.Tables.OCL_Types.E_None =>
(others => 0),
AMF.Internals.Tables.OCL_Types.E_OCL_Any_Type =>
(296 => 13, -- Classifier::attribute
400 => 3, -- NamedElement::clientDependency
297 => 14, -- Classifier::collaborationUse
401 => 4, -- Namespace::elementImport
298 => 15, -- Classifier::feature
299 => 16, -- Classifier::general
300 => 17, -- Classifier::generalization
402 => 5, -- Namespace::importedMember
301 => 18, -- Classifier::inheritedMember
403 => 6, -- Namespace::member
347 => 1, -- Element::ownedComment
348 => 2, -- Element::ownedElement
404 => 7, -- Namespace::ownedMember
405 => 8, -- Namespace::ownedRule
302 => 19, -- Classifier::ownedUseCase
406 => 9, -- Namespace::packageImport
303 => 20, -- Classifier::powertypeExtent
304 => 21, -- Classifier::redefinedClassifier
439 => 11, -- RedefinableElement::redefinedElement
440 => 12, -- RedefinableElement::redefinitionContext
305 => 22, -- Classifier::substitution
472 => 10, -- TemplateableElement::templateBinding
306 => 23, -- Classifier::useCase
others => 0),
AMF.Internals.Tables.OCL_Types.E_OCL_Association_Class_Call_Exp =>
(400 => 3, -- NamedElement::clientDependency
347 => 1, -- Element::ownedComment
348 => 2, -- Element::ownedElement
others => 0),
AMF.Internals.Tables.OCL_Types.E_OCL_Bag_Type =>
(296 => 13, -- Classifier::attribute
400 => 3, -- NamedElement::clientDependency
297 => 14, -- Classifier::collaborationUse
401 => 4, -- Namespace::elementImport
298 => 15, -- Classifier::feature
299 => 16, -- Classifier::general
300 => 17, -- Classifier::generalization
402 => 5, -- Namespace::importedMember
301 => 18, -- Classifier::inheritedMember
403 => 6, -- Namespace::member
334 => 24, -- DataType::ownedAttribute
347 => 1, -- Element::ownedComment
348 => 2, -- Element::ownedElement
404 => 7, -- Namespace::ownedMember
335 => 25, -- DataType::ownedOperation
405 => 8, -- Namespace::ownedRule
302 => 19, -- Classifier::ownedUseCase
406 => 9, -- Namespace::packageImport
303 => 20, -- Classifier::powertypeExtent
304 => 21, -- Classifier::redefinedClassifier
439 => 11, -- RedefinableElement::redefinedElement
440 => 12, -- RedefinableElement::redefinitionContext
305 => 22, -- Classifier::substitution
472 => 10, -- TemplateableElement::templateBinding
306 => 23, -- Classifier::useCase
others => 0),
AMF.Internals.Tables.OCL_Types.E_OCL_Boolean_Literal_Exp =>
(400 => 3, -- NamedElement::clientDependency
347 => 1, -- Element::ownedComment
348 => 2, -- Element::ownedElement
others => 0),
AMF.Internals.Tables.OCL_Types.E_OCL_Collection_Item =>
(400 => 3, -- NamedElement::clientDependency
347 => 1, -- Element::ownedComment
348 => 2, -- Element::ownedElement
others => 0),
AMF.Internals.Tables.OCL_Types.E_OCL_Collection_Literal_Exp =>
(400 => 3, -- NamedElement::clientDependency
347 => 1, -- Element::ownedComment
348 => 2, -- Element::ownedElement
others => 0),
AMF.Internals.Tables.OCL_Types.E_OCL_Collection_Range =>
(400 => 3, -- NamedElement::clientDependency
347 => 1, -- Element::ownedComment
348 => 2, -- Element::ownedElement
others => 0),
AMF.Internals.Tables.OCL_Types.E_OCL_Collection_Type =>
(296 => 13, -- Classifier::attribute
400 => 3, -- NamedElement::clientDependency
297 => 14, -- Classifier::collaborationUse
401 => 4, -- Namespace::elementImport
298 => 15, -- Classifier::feature
299 => 16, -- Classifier::general
300 => 17, -- Classifier::generalization
402 => 5, -- Namespace::importedMember
301 => 18, -- Classifier::inheritedMember
403 => 6, -- Namespace::member
334 => 24, -- DataType::ownedAttribute
347 => 1, -- Element::ownedComment
348 => 2, -- Element::ownedElement
404 => 7, -- Namespace::ownedMember
335 => 25, -- DataType::ownedOperation
405 => 8, -- Namespace::ownedRule
302 => 19, -- Classifier::ownedUseCase
406 => 9, -- Namespace::packageImport
303 => 20, -- Classifier::powertypeExtent
304 => 21, -- Classifier::redefinedClassifier
439 => 11, -- RedefinableElement::redefinedElement
440 => 12, -- RedefinableElement::redefinitionContext
305 => 22, -- Classifier::substitution
472 => 10, -- TemplateableElement::templateBinding
306 => 23, -- Classifier::useCase
others => 0),
AMF.Internals.Tables.OCL_Types.E_OCL_Enum_Literal_Exp =>
(400 => 3, -- NamedElement::clientDependency
347 => 1, -- Element::ownedComment
348 => 2, -- Element::ownedElement
others => 0),
AMF.Internals.Tables.OCL_Types.E_OCL_Expression_In_Ocl =>
(400 => 3, -- NamedElement::clientDependency
347 => 1, -- Element::ownedComment
348 => 2, -- Element::ownedElement
others => 0),
AMF.Internals.Tables.OCL_Types.E_OCL_If_Exp =>
(400 => 3, -- NamedElement::clientDependency
347 => 1, -- Element::ownedComment
348 => 2, -- Element::ownedElement
others => 0),
AMF.Internals.Tables.OCL_Types.E_OCL_Integer_Literal_Exp =>
(400 => 3, -- NamedElement::clientDependency
347 => 1, -- Element::ownedComment
348 => 2, -- Element::ownedElement
others => 0),
AMF.Internals.Tables.OCL_Types.E_OCL_Invalid_Literal_Exp =>
(400 => 3, -- NamedElement::clientDependency
347 => 1, -- Element::ownedComment
348 => 2, -- Element::ownedElement
others => 0),
AMF.Internals.Tables.OCL_Types.E_OCL_Invalid_Type =>
(296 => 13, -- Classifier::attribute
400 => 3, -- NamedElement::clientDependency
297 => 14, -- Classifier::collaborationUse
401 => 4, -- Namespace::elementImport
298 => 15, -- Classifier::feature
299 => 16, -- Classifier::general
300 => 17, -- Classifier::generalization
402 => 5, -- Namespace::importedMember
301 => 18, -- Classifier::inheritedMember
403 => 6, -- Namespace::member
347 => 1, -- Element::ownedComment
348 => 2, -- Element::ownedElement
404 => 7, -- Namespace::ownedMember
405 => 8, -- Namespace::ownedRule
302 => 19, -- Classifier::ownedUseCase
406 => 9, -- Namespace::packageImport
303 => 20, -- Classifier::powertypeExtent
304 => 21, -- Classifier::redefinedClassifier
439 => 11, -- RedefinableElement::redefinedElement
440 => 12, -- RedefinableElement::redefinitionContext
305 => 22, -- Classifier::substitution
472 => 10, -- TemplateableElement::templateBinding
306 => 23, -- Classifier::useCase
others => 0),
AMF.Internals.Tables.OCL_Types.E_OCL_Iterate_Exp =>
(400 => 3, -- NamedElement::clientDependency
347 => 1, -- Element::ownedComment
348 => 2, -- Element::ownedElement
others => 0),
AMF.Internals.Tables.OCL_Types.E_OCL_Iterator_Exp =>
(400 => 3, -- NamedElement::clientDependency
347 => 1, -- Element::ownedComment
348 => 2, -- Element::ownedElement
others => 0),
AMF.Internals.Tables.OCL_Types.E_OCL_Let_Exp =>
(400 => 3, -- NamedElement::clientDependency
347 => 1, -- Element::ownedComment
348 => 2, -- Element::ownedElement
others => 0),
AMF.Internals.Tables.OCL_Types.E_OCL_Message_Exp =>
(400 => 3, -- NamedElement::clientDependency
347 => 1, -- Element::ownedComment
348 => 2, -- Element::ownedElement
others => 0),
AMF.Internals.Tables.OCL_Types.E_OCL_Message_Type =>
(296 => 13, -- Classifier::attribute
400 => 3, -- NamedElement::clientDependency
297 => 14, -- Classifier::collaborationUse
401 => 4, -- Namespace::elementImport
298 => 15, -- Classifier::feature
299 => 16, -- Classifier::general
300 => 17, -- Classifier::generalization
402 => 5, -- Namespace::importedMember
301 => 18, -- Classifier::inheritedMember
403 => 6, -- Namespace::member
347 => 1, -- Element::ownedComment
348 => 2, -- Element::ownedElement
404 => 7, -- Namespace::ownedMember
405 => 8, -- Namespace::ownedRule
302 => 19, -- Classifier::ownedUseCase
406 => 9, -- Namespace::packageImport
303 => 20, -- Classifier::powertypeExtent
304 => 21, -- Classifier::redefinedClassifier
439 => 11, -- RedefinableElement::redefinedElement
440 => 12, -- RedefinableElement::redefinitionContext
305 => 22, -- Classifier::substitution
472 => 10, -- TemplateableElement::templateBinding
306 => 23, -- Classifier::useCase
others => 0),
AMF.Internals.Tables.OCL_Types.E_OCL_Null_Literal_Exp =>
(400 => 3, -- NamedElement::clientDependency
347 => 1, -- Element::ownedComment
348 => 2, -- Element::ownedElement
others => 0),
AMF.Internals.Tables.OCL_Types.E_OCL_Operation_Call_Exp =>
(400 => 3, -- NamedElement::clientDependency
347 => 1, -- Element::ownedComment
348 => 2, -- Element::ownedElement
others => 0),
AMF.Internals.Tables.OCL_Types.E_OCL_Ordered_Set_Type =>
(296 => 13, -- Classifier::attribute
400 => 3, -- NamedElement::clientDependency
297 => 14, -- Classifier::collaborationUse
401 => 4, -- Namespace::elementImport
298 => 15, -- Classifier::feature
299 => 16, -- Classifier::general
300 => 17, -- Classifier::generalization
402 => 5, -- Namespace::importedMember
301 => 18, -- Classifier::inheritedMember
403 => 6, -- Namespace::member
334 => 24, -- DataType::ownedAttribute
347 => 1, -- Element::ownedComment
348 => 2, -- Element::ownedElement
404 => 7, -- Namespace::ownedMember
335 => 25, -- DataType::ownedOperation
405 => 8, -- Namespace::ownedRule
302 => 19, -- Classifier::ownedUseCase
406 => 9, -- Namespace::packageImport
303 => 20, -- Classifier::powertypeExtent
304 => 21, -- Classifier::redefinedClassifier
439 => 11, -- RedefinableElement::redefinedElement
440 => 12, -- RedefinableElement::redefinitionContext
305 => 22, -- Classifier::substitution
472 => 10, -- TemplateableElement::templateBinding
306 => 23, -- Classifier::useCase
others => 0),
AMF.Internals.Tables.OCL_Types.E_OCL_Property_Call_Exp =>
(400 => 3, -- NamedElement::clientDependency
347 => 1, -- Element::ownedComment
348 => 2, -- Element::ownedElement
others => 0),
AMF.Internals.Tables.OCL_Types.E_OCL_Real_Literal_Exp =>
(400 => 3, -- NamedElement::clientDependency
347 => 1, -- Element::ownedComment
348 => 2, -- Element::ownedElement
others => 0),
AMF.Internals.Tables.OCL_Types.E_OCL_Sequence_Type =>
(296 => 13, -- Classifier::attribute
400 => 3, -- NamedElement::clientDependency
297 => 14, -- Classifier::collaborationUse
401 => 4, -- Namespace::elementImport
298 => 15, -- Classifier::feature
299 => 16, -- Classifier::general
300 => 17, -- Classifier::generalization
402 => 5, -- Namespace::importedMember
301 => 18, -- Classifier::inheritedMember
403 => 6, -- Namespace::member
334 => 24, -- DataType::ownedAttribute
347 => 1, -- Element::ownedComment
348 => 2, -- Element::ownedElement
404 => 7, -- Namespace::ownedMember
335 => 25, -- DataType::ownedOperation
405 => 8, -- Namespace::ownedRule
302 => 19, -- Classifier::ownedUseCase
406 => 9, -- Namespace::packageImport
303 => 20, -- Classifier::powertypeExtent
304 => 21, -- Classifier::redefinedClassifier
439 => 11, -- RedefinableElement::redefinedElement
440 => 12, -- RedefinableElement::redefinitionContext
305 => 22, -- Classifier::substitution
472 => 10, -- TemplateableElement::templateBinding
306 => 23, -- Classifier::useCase
others => 0),
AMF.Internals.Tables.OCL_Types.E_OCL_Set_Type =>
(296 => 13, -- Classifier::attribute
400 => 3, -- NamedElement::clientDependency
297 => 14, -- Classifier::collaborationUse
401 => 4, -- Namespace::elementImport
298 => 15, -- Classifier::feature
299 => 16, -- Classifier::general
300 => 17, -- Classifier::generalization
402 => 5, -- Namespace::importedMember
301 => 18, -- Classifier::inheritedMember
403 => 6, -- Namespace::member
334 => 24, -- DataType::ownedAttribute
347 => 1, -- Element::ownedComment
348 => 2, -- Element::ownedElement
404 => 7, -- Namespace::ownedMember
335 => 25, -- DataType::ownedOperation
405 => 8, -- Namespace::ownedRule
302 => 19, -- Classifier::ownedUseCase
406 => 9, -- Namespace::packageImport
303 => 20, -- Classifier::powertypeExtent
304 => 21, -- Classifier::redefinedClassifier
439 => 11, -- RedefinableElement::redefinedElement
440 => 12, -- RedefinableElement::redefinitionContext
305 => 22, -- Classifier::substitution
472 => 10, -- TemplateableElement::templateBinding
306 => 23, -- Classifier::useCase
others => 0),
AMF.Internals.Tables.OCL_Types.E_OCL_State_Exp =>
(400 => 3, -- NamedElement::clientDependency
347 => 1, -- Element::ownedComment
348 => 2, -- Element::ownedElement
others => 0),
AMF.Internals.Tables.OCL_Types.E_OCL_String_Literal_Exp =>
(400 => 3, -- NamedElement::clientDependency
347 => 1, -- Element::ownedComment
348 => 2, -- Element::ownedElement
others => 0),
AMF.Internals.Tables.OCL_Types.E_OCL_Template_Parameter_Type =>
(296 => 13, -- Classifier::attribute
400 => 3, -- NamedElement::clientDependency
297 => 14, -- Classifier::collaborationUse
401 => 4, -- Namespace::elementImport
298 => 15, -- Classifier::feature
299 => 16, -- Classifier::general
300 => 17, -- Classifier::generalization
402 => 5, -- Namespace::importedMember
301 => 18, -- Classifier::inheritedMember
403 => 6, -- Namespace::member
347 => 1, -- Element::ownedComment
348 => 2, -- Element::ownedElement
404 => 7, -- Namespace::ownedMember
405 => 8, -- Namespace::ownedRule
302 => 19, -- Classifier::ownedUseCase
406 => 9, -- Namespace::packageImport
303 => 20, -- Classifier::powertypeExtent
304 => 21, -- Classifier::redefinedClassifier
439 => 11, -- RedefinableElement::redefinedElement
440 => 12, -- RedefinableElement::redefinitionContext
305 => 22, -- Classifier::substitution
472 => 10, -- TemplateableElement::templateBinding
306 => 23, -- Classifier::useCase
others => 0),
AMF.Internals.Tables.OCL_Types.E_OCL_Tuple_Literal_Exp =>
(400 => 3, -- NamedElement::clientDependency
347 => 1, -- Element::ownedComment
348 => 2, -- Element::ownedElement
others => 0),
AMF.Internals.Tables.OCL_Types.E_OCL_Tuple_Literal_Part =>
(400 => 3, -- NamedElement::clientDependency
347 => 1, -- Element::ownedComment
348 => 2, -- Element::ownedElement
others => 0),
AMF.Internals.Tables.OCL_Types.E_OCL_Tuple_Type =>
(296 => 13, -- Classifier::attribute
400 => 3, -- NamedElement::clientDependency
297 => 14, -- Classifier::collaborationUse
401 => 4, -- Namespace::elementImport
298 => 15, -- Classifier::feature
299 => 16, -- Classifier::general
300 => 17, -- Classifier::generalization
402 => 5, -- Namespace::importedMember
301 => 18, -- Classifier::inheritedMember
403 => 6, -- Namespace::member
334 => 24, -- DataType::ownedAttribute
347 => 1, -- Element::ownedComment
348 => 2, -- Element::ownedElement
404 => 7, -- Namespace::ownedMember
335 => 25, -- DataType::ownedOperation
405 => 8, -- Namespace::ownedRule
302 => 19, -- Classifier::ownedUseCase
406 => 9, -- Namespace::packageImport
303 => 20, -- Classifier::powertypeExtent
304 => 21, -- Classifier::redefinedClassifier
439 => 11, -- RedefinableElement::redefinedElement
440 => 12, -- RedefinableElement::redefinitionContext
305 => 22, -- Classifier::substitution
472 => 10, -- TemplateableElement::templateBinding
306 => 23, -- Classifier::useCase
others => 0),
AMF.Internals.Tables.OCL_Types.E_OCL_Type_Exp =>
(400 => 3, -- NamedElement::clientDependency
347 => 1, -- Element::ownedComment
348 => 2, -- Element::ownedElement
others => 0),
AMF.Internals.Tables.OCL_Types.E_OCL_Unlimited_Natural_Literal_Exp =>
(400 => 3, -- NamedElement::clientDependency
347 => 1, -- Element::ownedComment
348 => 2, -- Element::ownedElement
others => 0),
AMF.Internals.Tables.OCL_Types.E_OCL_Unspecified_Value_Exp =>
(400 => 3, -- NamedElement::clientDependency
347 => 1, -- Element::ownedComment
348 => 2, -- Element::ownedElement
others => 0),
AMF.Internals.Tables.OCL_Types.E_OCL_Variable =>
(400 => 3, -- NamedElement::clientDependency
347 => 1, -- Element::ownedComment
348 => 2, -- Element::ownedElement
others => 0),
AMF.Internals.Tables.OCL_Types.E_OCL_Variable_Exp =>
(400 => 3, -- NamedElement::clientDependency
347 => 1, -- Element::ownedComment
348 => 2, -- Element::ownedElement
others => 0),
AMF.Internals.Tables.OCL_Types.E_OCL_Void_Type =>
(296 => 13, -- Classifier::attribute
400 => 3, -- NamedElement::clientDependency
297 => 14, -- Classifier::collaborationUse
401 => 4, -- Namespace::elementImport
298 => 15, -- Classifier::feature
299 => 16, -- Classifier::general
300 => 17, -- Classifier::generalization
402 => 5, -- Namespace::importedMember
301 => 18, -- Classifier::inheritedMember
403 => 6, -- Namespace::member
347 => 1, -- Element::ownedComment
348 => 2, -- Element::ownedElement
404 => 7, -- Namespace::ownedMember
405 => 8, -- Namespace::ownedRule
302 => 19, -- Classifier::ownedUseCase
406 => 9, -- Namespace::packageImport
303 => 20, -- Classifier::powertypeExtent
304 => 21, -- Classifier::redefinedClassifier
439 => 11, -- RedefinableElement::redefinedElement
440 => 12, -- RedefinableElement::redefinitionContext
305 => 22, -- Classifier::substitution
472 => 10, -- TemplateableElement::templateBinding
306 => 23, -- Classifier::useCase
others => 0));
UML_Member_Offset : constant
array (AMF.Internals.Tables.OCL_Types.Element_Kinds,
AMF.Internals.CMOF_Element range 483 .. 866) of Natural :=
(AMF.Internals.Tables.OCL_Types.E_None =>
(others => 0),
AMF.Internals.Tables.OCL_Types.E_OCL_Any_Type =>
(530 => 12, -- Classifier::isAbstract
531 => 13, -- Classifier::isFinalSpecialization
772 => 11, -- RedefinableElement::isLeaf
669 => 2, -- NamedElement::name
670 => 3, -- NamedElement::nameExpression
671 => 4, -- NamedElement::namespace
532 => 14, -- Classifier::ownedTemplateSignature
831 => 10, -- TemplateableElement::ownedTemplateSignature
577 => 1, -- Element::owner
718 => 8, -- ParameterableElement::owningTemplateParameter
853 => 7, -- Type::package
672 => 5, -- NamedElement::qualifiedName
533 => 15, -- Classifier::representation
534 => 16, -- Classifier::templateParameter
719 => 9, -- ParameterableElement::templateParameter
673 => 6, -- NamedElement::visibility
710 => 6, -- PackageableElement::visibility
others => 0),
AMF.Internals.Tables.OCL_Types.E_OCL_Association_Class_Call_Exp =>
(669 => 2, -- NamedElement::name
670 => 3, -- NamedElement::nameExpression
671 => 4, -- NamedElement::namespace
577 => 1, -- Element::owner
672 => 5, -- NamedElement::qualifiedName
854 => 7, -- TypedElement::type
673 => 6, -- NamedElement::visibility
others => 0),
AMF.Internals.Tables.OCL_Types.E_OCL_Bag_Type =>
(530 => 12, -- Classifier::isAbstract
531 => 13, -- Classifier::isFinalSpecialization
772 => 11, -- RedefinableElement::isLeaf
669 => 2, -- NamedElement::name
670 => 3, -- NamedElement::nameExpression
671 => 4, -- NamedElement::namespace
532 => 14, -- Classifier::ownedTemplateSignature
831 => 10, -- TemplateableElement::ownedTemplateSignature
577 => 1, -- Element::owner
718 => 8, -- ParameterableElement::owningTemplateParameter
853 => 7, -- Type::package
672 => 5, -- NamedElement::qualifiedName
533 => 15, -- Classifier::representation
534 => 16, -- Classifier::templateParameter
719 => 9, -- ParameterableElement::templateParameter
673 => 6, -- NamedElement::visibility
710 => 6, -- PackageableElement::visibility
others => 0),
AMF.Internals.Tables.OCL_Types.E_OCL_Boolean_Literal_Exp =>
(669 => 2, -- NamedElement::name
670 => 3, -- NamedElement::nameExpression
671 => 4, -- NamedElement::namespace
577 => 1, -- Element::owner
672 => 5, -- NamedElement::qualifiedName
854 => 7, -- TypedElement::type
673 => 6, -- NamedElement::visibility
others => 0),
AMF.Internals.Tables.OCL_Types.E_OCL_Collection_Item =>
(669 => 2, -- NamedElement::name
670 => 3, -- NamedElement::nameExpression
671 => 4, -- NamedElement::namespace
577 => 1, -- Element::owner
672 => 5, -- NamedElement::qualifiedName
854 => 7, -- TypedElement::type
673 => 6, -- NamedElement::visibility
others => 0),
AMF.Internals.Tables.OCL_Types.E_OCL_Collection_Literal_Exp =>
(669 => 2, -- NamedElement::name
670 => 3, -- NamedElement::nameExpression
671 => 4, -- NamedElement::namespace
577 => 1, -- Element::owner
672 => 5, -- NamedElement::qualifiedName
854 => 7, -- TypedElement::type
673 => 6, -- NamedElement::visibility
others => 0),
AMF.Internals.Tables.OCL_Types.E_OCL_Collection_Range =>
(669 => 2, -- NamedElement::name
670 => 3, -- NamedElement::nameExpression
671 => 4, -- NamedElement::namespace
577 => 1, -- Element::owner
672 => 5, -- NamedElement::qualifiedName
854 => 7, -- TypedElement::type
673 => 6, -- NamedElement::visibility
others => 0),
AMF.Internals.Tables.OCL_Types.E_OCL_Collection_Type =>
(530 => 12, -- Classifier::isAbstract
531 => 13, -- Classifier::isFinalSpecialization
772 => 11, -- RedefinableElement::isLeaf
669 => 2, -- NamedElement::name
670 => 3, -- NamedElement::nameExpression
671 => 4, -- NamedElement::namespace
532 => 14, -- Classifier::ownedTemplateSignature
831 => 10, -- TemplateableElement::ownedTemplateSignature
577 => 1, -- Element::owner
718 => 8, -- ParameterableElement::owningTemplateParameter
853 => 7, -- Type::package
672 => 5, -- NamedElement::qualifiedName
533 => 15, -- Classifier::representation
534 => 16, -- Classifier::templateParameter
719 => 9, -- ParameterableElement::templateParameter
673 => 6, -- NamedElement::visibility
710 => 6, -- PackageableElement::visibility
others => 0),
AMF.Internals.Tables.OCL_Types.E_OCL_Enum_Literal_Exp =>
(669 => 2, -- NamedElement::name
670 => 3, -- NamedElement::nameExpression
671 => 4, -- NamedElement::namespace
577 => 1, -- Element::owner
672 => 5, -- NamedElement::qualifiedName
854 => 7, -- TypedElement::type
673 => 6, -- NamedElement::visibility
others => 0),
AMF.Internals.Tables.OCL_Types.E_OCL_Expression_In_Ocl =>
(687 => 10, -- OpaqueExpression::behavior
688 => 11, -- OpaqueExpression::body
689 => 12, -- OpaqueExpression::language
669 => 2, -- NamedElement::name
670 => 3, -- NamedElement::nameExpression
671 => 4, -- NamedElement::namespace
577 => 1, -- Element::owner
718 => 8, -- ParameterableElement::owningTemplateParameter
672 => 5, -- NamedElement::qualifiedName
690 => 13, -- OpaqueExpression::result
719 => 9, -- ParameterableElement::templateParameter
854 => 7, -- TypedElement::type
673 => 6, -- NamedElement::visibility
710 => 6, -- PackageableElement::visibility
others => 0),
AMF.Internals.Tables.OCL_Types.E_OCL_If_Exp =>
(669 => 2, -- NamedElement::name
670 => 3, -- NamedElement::nameExpression
671 => 4, -- NamedElement::namespace
577 => 1, -- Element::owner
672 => 5, -- NamedElement::qualifiedName
854 => 7, -- TypedElement::type
673 => 6, -- NamedElement::visibility
others => 0),
AMF.Internals.Tables.OCL_Types.E_OCL_Integer_Literal_Exp =>
(669 => 2, -- NamedElement::name
670 => 3, -- NamedElement::nameExpression
671 => 4, -- NamedElement::namespace
577 => 1, -- Element::owner
672 => 5, -- NamedElement::qualifiedName
854 => 7, -- TypedElement::type
673 => 6, -- NamedElement::visibility
others => 0),
AMF.Internals.Tables.OCL_Types.E_OCL_Invalid_Literal_Exp =>
(669 => 2, -- NamedElement::name
670 => 3, -- NamedElement::nameExpression
671 => 4, -- NamedElement::namespace
577 => 1, -- Element::owner
672 => 5, -- NamedElement::qualifiedName
854 => 7, -- TypedElement::type
673 => 6, -- NamedElement::visibility
others => 0),
AMF.Internals.Tables.OCL_Types.E_OCL_Invalid_Type =>
(530 => 12, -- Classifier::isAbstract
531 => 13, -- Classifier::isFinalSpecialization
772 => 11, -- RedefinableElement::isLeaf
669 => 2, -- NamedElement::name
670 => 3, -- NamedElement::nameExpression
671 => 4, -- NamedElement::namespace
532 => 14, -- Classifier::ownedTemplateSignature
831 => 10, -- TemplateableElement::ownedTemplateSignature
577 => 1, -- Element::owner
718 => 8, -- ParameterableElement::owningTemplateParameter
853 => 7, -- Type::package
672 => 5, -- NamedElement::qualifiedName
533 => 15, -- Classifier::representation
534 => 16, -- Classifier::templateParameter
719 => 9, -- ParameterableElement::templateParameter
673 => 6, -- NamedElement::visibility
710 => 6, -- PackageableElement::visibility
others => 0),
AMF.Internals.Tables.OCL_Types.E_OCL_Iterate_Exp =>
(669 => 2, -- NamedElement::name
670 => 3, -- NamedElement::nameExpression
671 => 4, -- NamedElement::namespace
577 => 1, -- Element::owner
672 => 5, -- NamedElement::qualifiedName
854 => 7, -- TypedElement::type
673 => 6, -- NamedElement::visibility
others => 0),
AMF.Internals.Tables.OCL_Types.E_OCL_Iterator_Exp =>
(669 => 2, -- NamedElement::name
670 => 3, -- NamedElement::nameExpression
671 => 4, -- NamedElement::namespace
577 => 1, -- Element::owner
672 => 5, -- NamedElement::qualifiedName
854 => 7, -- TypedElement::type
673 => 6, -- NamedElement::visibility
others => 0),
AMF.Internals.Tables.OCL_Types.E_OCL_Let_Exp =>
(669 => 2, -- NamedElement::name
670 => 3, -- NamedElement::nameExpression
671 => 4, -- NamedElement::namespace
577 => 1, -- Element::owner
672 => 5, -- NamedElement::qualifiedName
854 => 7, -- TypedElement::type
673 => 6, -- NamedElement::visibility
others => 0),
AMF.Internals.Tables.OCL_Types.E_OCL_Message_Exp =>
(669 => 2, -- NamedElement::name
670 => 3, -- NamedElement::nameExpression
671 => 4, -- NamedElement::namespace
577 => 1, -- Element::owner
672 => 5, -- NamedElement::qualifiedName
854 => 7, -- TypedElement::type
673 => 6, -- NamedElement::visibility
others => 0),
AMF.Internals.Tables.OCL_Types.E_OCL_Message_Type =>
(530 => 12, -- Classifier::isAbstract
531 => 13, -- Classifier::isFinalSpecialization
772 => 11, -- RedefinableElement::isLeaf
669 => 2, -- NamedElement::name
670 => 3, -- NamedElement::nameExpression
671 => 4, -- NamedElement::namespace
532 => 14, -- Classifier::ownedTemplateSignature
831 => 10, -- TemplateableElement::ownedTemplateSignature
577 => 1, -- Element::owner
718 => 8, -- ParameterableElement::owningTemplateParameter
853 => 7, -- Type::package
672 => 5, -- NamedElement::qualifiedName
533 => 15, -- Classifier::representation
534 => 16, -- Classifier::templateParameter
719 => 9, -- ParameterableElement::templateParameter
673 => 6, -- NamedElement::visibility
710 => 6, -- PackageableElement::visibility
others => 0),
AMF.Internals.Tables.OCL_Types.E_OCL_Null_Literal_Exp =>
(669 => 2, -- NamedElement::name
670 => 3, -- NamedElement::nameExpression
671 => 4, -- NamedElement::namespace
577 => 1, -- Element::owner
672 => 5, -- NamedElement::qualifiedName
854 => 7, -- TypedElement::type
673 => 6, -- NamedElement::visibility
others => 0),
AMF.Internals.Tables.OCL_Types.E_OCL_Operation_Call_Exp =>
(669 => 2, -- NamedElement::name
670 => 3, -- NamedElement::nameExpression
671 => 4, -- NamedElement::namespace
577 => 1, -- Element::owner
672 => 5, -- NamedElement::qualifiedName
854 => 7, -- TypedElement::type
673 => 6, -- NamedElement::visibility
others => 0),
AMF.Internals.Tables.OCL_Types.E_OCL_Ordered_Set_Type =>
(530 => 12, -- Classifier::isAbstract
531 => 13, -- Classifier::isFinalSpecialization
772 => 11, -- RedefinableElement::isLeaf
669 => 2, -- NamedElement::name
670 => 3, -- NamedElement::nameExpression
671 => 4, -- NamedElement::namespace
532 => 14, -- Classifier::ownedTemplateSignature
831 => 10, -- TemplateableElement::ownedTemplateSignature
577 => 1, -- Element::owner
718 => 8, -- ParameterableElement::owningTemplateParameter
853 => 7, -- Type::package
672 => 5, -- NamedElement::qualifiedName
533 => 15, -- Classifier::representation
534 => 16, -- Classifier::templateParameter
719 => 9, -- ParameterableElement::templateParameter
673 => 6, -- NamedElement::visibility
710 => 6, -- PackageableElement::visibility
others => 0),
AMF.Internals.Tables.OCL_Types.E_OCL_Property_Call_Exp =>
(669 => 2, -- NamedElement::name
670 => 3, -- NamedElement::nameExpression
671 => 4, -- NamedElement::namespace
577 => 1, -- Element::owner
672 => 5, -- NamedElement::qualifiedName
854 => 7, -- TypedElement::type
673 => 6, -- NamedElement::visibility
others => 0),
AMF.Internals.Tables.OCL_Types.E_OCL_Real_Literal_Exp =>
(669 => 2, -- NamedElement::name
670 => 3, -- NamedElement::nameExpression
671 => 4, -- NamedElement::namespace
577 => 1, -- Element::owner
672 => 5, -- NamedElement::qualifiedName
854 => 7, -- TypedElement::type
673 => 6, -- NamedElement::visibility
others => 0),
AMF.Internals.Tables.OCL_Types.E_OCL_Sequence_Type =>
(530 => 12, -- Classifier::isAbstract
531 => 13, -- Classifier::isFinalSpecialization
772 => 11, -- RedefinableElement::isLeaf
669 => 2, -- NamedElement::name
670 => 3, -- NamedElement::nameExpression
671 => 4, -- NamedElement::namespace
532 => 14, -- Classifier::ownedTemplateSignature
831 => 10, -- TemplateableElement::ownedTemplateSignature
577 => 1, -- Element::owner
718 => 8, -- ParameterableElement::owningTemplateParameter
853 => 7, -- Type::package
672 => 5, -- NamedElement::qualifiedName
533 => 15, -- Classifier::representation
534 => 16, -- Classifier::templateParameter
719 => 9, -- ParameterableElement::templateParameter
673 => 6, -- NamedElement::visibility
710 => 6, -- PackageableElement::visibility
others => 0),
AMF.Internals.Tables.OCL_Types.E_OCL_Set_Type =>
(530 => 12, -- Classifier::isAbstract
531 => 13, -- Classifier::isFinalSpecialization
772 => 11, -- RedefinableElement::isLeaf
669 => 2, -- NamedElement::name
670 => 3, -- NamedElement::nameExpression
671 => 4, -- NamedElement::namespace
532 => 14, -- Classifier::ownedTemplateSignature
831 => 10, -- TemplateableElement::ownedTemplateSignature
577 => 1, -- Element::owner
718 => 8, -- ParameterableElement::owningTemplateParameter
853 => 7, -- Type::package
672 => 5, -- NamedElement::qualifiedName
533 => 15, -- Classifier::representation
534 => 16, -- Classifier::templateParameter
719 => 9, -- ParameterableElement::templateParameter
673 => 6, -- NamedElement::visibility
710 => 6, -- PackageableElement::visibility
others => 0),
AMF.Internals.Tables.OCL_Types.E_OCL_State_Exp =>
(669 => 2, -- NamedElement::name
670 => 3, -- NamedElement::nameExpression
671 => 4, -- NamedElement::namespace
577 => 1, -- Element::owner
672 => 5, -- NamedElement::qualifiedName
854 => 7, -- TypedElement::type
673 => 6, -- NamedElement::visibility
others => 0),
AMF.Internals.Tables.OCL_Types.E_OCL_String_Literal_Exp =>
(669 => 2, -- NamedElement::name
670 => 3, -- NamedElement::nameExpression
671 => 4, -- NamedElement::namespace
577 => 1, -- Element::owner
672 => 5, -- NamedElement::qualifiedName
854 => 7, -- TypedElement::type
673 => 6, -- NamedElement::visibility
others => 0),
AMF.Internals.Tables.OCL_Types.E_OCL_Template_Parameter_Type =>
(530 => 12, -- Classifier::isAbstract
531 => 13, -- Classifier::isFinalSpecialization
772 => 11, -- RedefinableElement::isLeaf
669 => 2, -- NamedElement::name
670 => 3, -- NamedElement::nameExpression
671 => 4, -- NamedElement::namespace
532 => 14, -- Classifier::ownedTemplateSignature
831 => 10, -- TemplateableElement::ownedTemplateSignature
577 => 1, -- Element::owner
718 => 8, -- ParameterableElement::owningTemplateParameter
853 => 7, -- Type::package
672 => 5, -- NamedElement::qualifiedName
533 => 15, -- Classifier::representation
534 => 16, -- Classifier::templateParameter
719 => 9, -- ParameterableElement::templateParameter
673 => 6, -- NamedElement::visibility
710 => 6, -- PackageableElement::visibility
others => 0),
AMF.Internals.Tables.OCL_Types.E_OCL_Tuple_Literal_Exp =>
(669 => 2, -- NamedElement::name
670 => 3, -- NamedElement::nameExpression
671 => 4, -- NamedElement::namespace
577 => 1, -- Element::owner
672 => 5, -- NamedElement::qualifiedName
854 => 7, -- TypedElement::type
673 => 6, -- NamedElement::visibility
others => 0),
AMF.Internals.Tables.OCL_Types.E_OCL_Tuple_Literal_Part =>
(669 => 2, -- NamedElement::name
670 => 3, -- NamedElement::nameExpression
671 => 4, -- NamedElement::namespace
577 => 1, -- Element::owner
672 => 5, -- NamedElement::qualifiedName
854 => 7, -- TypedElement::type
673 => 6, -- NamedElement::visibility
others => 0),
AMF.Internals.Tables.OCL_Types.E_OCL_Tuple_Type =>
(530 => 12, -- Classifier::isAbstract
531 => 13, -- Classifier::isFinalSpecialization
772 => 11, -- RedefinableElement::isLeaf
669 => 2, -- NamedElement::name
670 => 3, -- NamedElement::nameExpression
671 => 4, -- NamedElement::namespace
532 => 14, -- Classifier::ownedTemplateSignature
831 => 10, -- TemplateableElement::ownedTemplateSignature
577 => 1, -- Element::owner
718 => 8, -- ParameterableElement::owningTemplateParameter
853 => 7, -- Type::package
672 => 5, -- NamedElement::qualifiedName
533 => 15, -- Classifier::representation
534 => 16, -- Classifier::templateParameter
719 => 9, -- ParameterableElement::templateParameter
673 => 6, -- NamedElement::visibility
710 => 6, -- PackageableElement::visibility
others => 0),
AMF.Internals.Tables.OCL_Types.E_OCL_Type_Exp =>
(669 => 2, -- NamedElement::name
670 => 3, -- NamedElement::nameExpression
671 => 4, -- NamedElement::namespace
577 => 1, -- Element::owner
672 => 5, -- NamedElement::qualifiedName
854 => 7, -- TypedElement::type
673 => 6, -- NamedElement::visibility
others => 0),
AMF.Internals.Tables.OCL_Types.E_OCL_Unlimited_Natural_Literal_Exp =>
(669 => 2, -- NamedElement::name
670 => 3, -- NamedElement::nameExpression
671 => 4, -- NamedElement::namespace
577 => 1, -- Element::owner
672 => 5, -- NamedElement::qualifiedName
854 => 7, -- TypedElement::type
673 => 6, -- NamedElement::visibility
others => 0),
AMF.Internals.Tables.OCL_Types.E_OCL_Unspecified_Value_Exp =>
(669 => 2, -- NamedElement::name
670 => 3, -- NamedElement::nameExpression
671 => 4, -- NamedElement::namespace
577 => 1, -- Element::owner
672 => 5, -- NamedElement::qualifiedName
854 => 7, -- TypedElement::type
673 => 6, -- NamedElement::visibility
others => 0),
AMF.Internals.Tables.OCL_Types.E_OCL_Variable =>
(669 => 2, -- NamedElement::name
670 => 3, -- NamedElement::nameExpression
671 => 4, -- NamedElement::namespace
577 => 1, -- Element::owner
672 => 5, -- NamedElement::qualifiedName
854 => 7, -- TypedElement::type
673 => 6, -- NamedElement::visibility
others => 0),
AMF.Internals.Tables.OCL_Types.E_OCL_Variable_Exp =>
(669 => 2, -- NamedElement::name
670 => 3, -- NamedElement::nameExpression
671 => 4, -- NamedElement::namespace
577 => 1, -- Element::owner
672 => 5, -- NamedElement::qualifiedName
854 => 7, -- TypedElement::type
673 => 6, -- NamedElement::visibility
others => 0),
AMF.Internals.Tables.OCL_Types.E_OCL_Void_Type =>
(530 => 12, -- Classifier::isAbstract
531 => 13, -- Classifier::isFinalSpecialization
772 => 11, -- RedefinableElement::isLeaf
669 => 2, -- NamedElement::name
670 => 3, -- NamedElement::nameExpression
671 => 4, -- NamedElement::namespace
532 => 14, -- Classifier::ownedTemplateSignature
831 => 10, -- TemplateableElement::ownedTemplateSignature
577 => 1, -- Element::owner
718 => 8, -- ParameterableElement::owningTemplateParameter
853 => 7, -- Type::package
672 => 5, -- NamedElement::qualifiedName
533 => 15, -- Classifier::representation
534 => 16, -- Classifier::templateParameter
719 => 9, -- ParameterableElement::templateParameter
673 => 6, -- NamedElement::visibility
710 => 6, -- PackageableElement::visibility
others => 0));
end AMF.Internals.Tables.OCL_Attribute_Mappings;
|
gitter-badger/libAnne | Ada | 2,836 | adb | with Ada.Wide_Wide_Text_IO;
use Ada.Wide_Wide_Text_IO;
package body Generics.Testing.Fixed_Assertions is
function Assert(Statement : Wide_Wide_String; Object : Fixed_Type) return Asserter is
begin
return Asserter'(Statement_Length => Statement'Length, Statement => Statement, Object => Object, Tolerance => <>);
end Assert;
function Assert(Statement : Wide_Wide_String; Object : Fixed_Type; Tolerance : Fixed_Type) return Asserter is
begin
return Asserter'(Statement_Length => Statement'Length, Statement => Statement, Object => Object, Tolerance => Tolerance);
end Assert;
function Equal(Self : Asserter; Value : Fixed_Type) return Asserter is
Result : Asserter := Self;
begin
if (Value - Result.Tolerance) > Result.Object or Result.Object > (Value + Result.Tolerance) then
Put_Line(" ❌ " & Self.Statement & " → " & Fixed_Type'Wide_Wide_Image(Self.Object) & " = " & Fixed_Type'Wide_Wide_Image(Value) & " ± " & Fixed_Type'Wide_Wide_Image(Result.Tolerance));
end if;
return Result;
end Equal;
procedure Equal(Self : Asserter; Value : Fixed_Type) is
Result : Asserter := Self.Equal(Value);
begin
null;
end Equal;
function Not_Equal(Self : Asserter; Value : Fixed_Type) return Asserter is
Result : Asserter := Self;
begin
if (Value - Result.Tolerance) <= Result.Object and Result.Object <= (Value + Result.Tolerance) then
Put_Line(" ❌ " & Self.Statement & " → " & Fixed_Type'Wide_Wide_Image(Self.Object) & " ≠ " & Fixed_Type'Wide_Wide_Image(Value) & " ± " & Fixed_Type'Wide_Wide_Image(Result.Tolerance));
end if;
return Result;
end Not_Equal;
procedure Not_Equal(Self : Asserter; Value : Fixed_Type) is
Result : Asserter := Self.Equal(Value);
begin
null;
end Not_Equal;
function Greater(Self : Asserter; Value : Fixed_Type) return Asserter is
Result : Asserter := Self;
begin
if Result.Object <= (Value + Result.Tolerance) then
Put_Line(" ❌ " & Self.Statement & " → " & Fixed_Type'Wide_Wide_Image(Self.Object) & " > " & Fixed_Type'Wide_Wide_Image(Value) & " ± " & Fixed_Type'Wide_Wide_Image(Result.Tolerance));
end if;
return Result;
end Greater;
procedure Greater(Self : Asserter; Value : Fixed_Type) is
Result : Asserter := Self.Greater(Value);
begin
null;
end Greater;
function Lesser(Self : Asserter; Value : Fixed_Type) return Asserter is
Result : Asserter := Self;
begin
if Result.Object >= (Value - Result.Tolerance) then
Put_Line(" ❌ " & Self.Statement & " → " & Fixed_Type'Wide_Wide_Image(Self.Object) & " < " & Fixed_Type'Wide_Wide_Image(Value) & " ± " & Fixed_Type'Wide_Wide_Image(Result.Tolerance));
end if;
return Result;
end Lesser;
procedure Lesser(Self : Asserter; Value : Fixed_Type) is
Result : Asserter := Self.Lesser(Value);
begin
null;
end Lesser;
end Generics.Testing.Fixed_Assertions; |
zhmu/ananas | Ada | 32,255 | adb | ------------------------------------------------------------------------------
-- --
-- GNAT COMPILER COMPONENTS --
-- --
-- P P R I N T --
-- --
-- B o d y --
-- --
-- Copyright (C) 2008-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 Atree; use Atree;
with Einfo; use Einfo;
with Einfo.Entities; use Einfo.Entities;
with Einfo.Utils; use Einfo.Utils;
with Namet; use Namet;
with Nlists; use Nlists;
with Opt; use Opt;
with Sinfo; use Sinfo;
with Sinfo.Nodes; use Sinfo.Nodes;
with Sinfo.Utils; use Sinfo.Utils;
with Sinput; use Sinput;
with Snames; use Snames;
with Uintp; use Uintp;
with System.Case_Util;
package body Pprint is
List_Name_Count : Natural := 0;
-- Counter used to prevent infinite recursion while computing name of
-- complex expressions.
----------------------
-- Expression_Image --
----------------------
function Expression_Image
(Expr : Node_Id;
Default : String) return String
is
From_Source : constant Boolean :=
Comes_From_Source (Expr)
and then not Opt.Debug_Generated_Code;
Append_Paren : Natural := 0;
Left : Node_Id := Original_Node (Expr);
Right : Node_Id := Original_Node (Expr);
function Expr_Name
(Expr : Node_Id;
Take_Prefix : Boolean := True;
Expand_Type : Boolean := True) return String;
-- Return string corresponding to Expr. If no string can be extracted,
-- return "...". If Take_Prefix is True, go back to prefix when needed,
-- otherwise only consider the right-hand side of an expression. If
-- Expand_Type is True and Expr is a type, try to expand Expr (an
-- internally generated type) into a user understandable name.
Max_List : constant := 3;
-- Limit number of list elements to dump
Max_Expr_Elements : constant := 24;
-- Limit number of elements in an expression for use by Expr_Name
Num_Elements : Natural := 0;
-- Current number of elements processed by Expr_Name
function List_Name
(List : Node_Id;
Add_Space : Boolean := True;
Add_Paren : Boolean := True) return String;
-- Return a string corresponding to List
---------------
-- List_Name --
---------------
function List_Name
(List : Node_Id;
Add_Space : Boolean := True;
Add_Paren : Boolean := True) return String
is
function Internal_List_Name
(List : Node_Id;
First : Boolean := True;
Add_Space : Boolean := True;
Add_Paren : Boolean := True;
Num : Natural := 1) return String;
-- Created for purposes of recursing on embedded lists
------------------------
-- Internal_List_Name --
------------------------
function Internal_List_Name
(List : Node_Id;
First : Boolean := True;
Add_Space : Boolean := True;
Add_Paren : Boolean := True;
Num : Natural := 1) return String
is
begin
if not Present (List) then
if First or else not Add_Paren then
return "";
else
return ")";
end if;
elsif Num > Max_List then
if Add_Paren then
return ", ...)";
else
return ", ...";
end if;
end if;
-- Continue recursing on the list - handling the first element
-- in a special way.
return
(if First then
(if Add_Space and Add_Paren then " ("
elsif Add_Paren then "("
elsif Add_Space then " "
else "")
else ", ")
& Expr_Name (List)
& Internal_List_Name
(List => Next (List),
First => False,
Add_Paren => Add_Paren,
Num => Num + 1);
end Internal_List_Name;
-- Start of processing for List_Name
begin
-- Prevent infinite recursion by limiting depth to 3
if List_Name_Count > 3 then
return "...";
end if;
List_Name_Count := List_Name_Count + 1;
declare
Result : constant String :=
Internal_List_Name
(List => List,
Add_Space => Add_Space,
Add_Paren => Add_Paren);
begin
List_Name_Count := List_Name_Count - 1;
return Result;
end;
end List_Name;
---------------
-- Expr_Name --
---------------
function Expr_Name
(Expr : Node_Id;
Take_Prefix : Boolean := True;
Expand_Type : Boolean := True) return String
is
begin
Num_Elements := Num_Elements + 1;
if Num_Elements > Max_Expr_Elements then
return "...";
end if;
case Nkind (Expr) is
when N_Defining_Identifier
| N_Identifier
=>
return Ident_Image (Expr, Expression_Image.Expr, Expand_Type);
when N_Character_Literal =>
declare
Char : constant Int := UI_To_Int (Char_Literal_Value (Expr));
begin
if Char in 32 .. 127 then
return "'" & Character'Val (Char) & "'";
else
UI_Image (Char_Literal_Value (Expr));
return
"'\" & UI_Image_Buffer (1 .. UI_Image_Length) & "'";
end if;
end;
when N_Integer_Literal =>
return UI_Image (Intval (Expr));
when N_Real_Literal =>
return Real_Image (Realval (Expr));
when N_String_Literal =>
return String_Image (Strval (Expr));
when N_Allocator =>
return "new " & Expr_Name (Expression (Expr));
when N_Aggregate =>
if Present (Expressions (Expr)) then
return
List_Name
(List => First (Expressions (Expr)),
Add_Space => False);
-- Do not return empty string for (others => <>) aggregate
-- of a componentless record type. At least one caller (the
-- recursive call below in the N_Qualified_Expression case)
-- is not prepared to deal with a zero-length result.
elsif Null_Record_Present (Expr)
or else not Present (First (Component_Associations (Expr)))
then
return ("(null record)");
else
return
List_Name
(List => First (Component_Associations (Expr)),
Add_Space => False,
Add_Paren => False);
end if;
when N_Extension_Aggregate =>
return "(" & Expr_Name (Ancestor_Part (Expr)) & " with "
& List_Name
(List => First (Expressions (Expr)),
Add_Space => False,
Add_Paren => False) & ")";
when N_Attribute_Reference =>
if Take_Prefix then
declare
Id : constant Attribute_Id :=
Get_Attribute_Id (Attribute_Name (Expr));
-- Always use mixed case for attributes
Str : constant String :=
Expr_Name (Prefix (Expr))
& "'"
& System.Case_Util.To_Mixed
(Get_Name_String (Attribute_Name (Expr)));
N : Node_Id;
Ranges : List_Id;
begin
if (Id = Attribute_First or else Id = Attribute_Last)
and then Str (Str'First) = '$'
then
N := Associated_Node_For_Itype (Etype (Prefix (Expr)));
if Present (N) then
if Nkind (N) = N_Full_Type_Declaration then
N := Type_Definition (N);
end if;
if Nkind (N) = N_Subtype_Declaration then
Ranges :=
Constraints
(Constraint (Subtype_Indication (N)));
if List_Length (Ranges) = 1
and then Nkind (First (Ranges)) in
N_Range |
N_Real_Range_Specification |
N_Signed_Integer_Type_Definition
then
if Id = Attribute_First then
return
Expression_Image
(Low_Bound (First (Ranges)), Str);
else
return
Expression_Image
(High_Bound (First (Ranges)), Str);
end if;
end if;
end if;
end if;
end if;
return Str;
end;
else
return "'" & Get_Name_String (Attribute_Name (Expr));
end if;
when N_Explicit_Dereference =>
Explicit_Dereference : declare
function Deref_Suffix return String;
-- Usually returns ".all", but will return "" if
-- Hide_Temp_Derefs is true and the prefix is a use of a
-- not-from-source object declared as
-- X : constant Some_Access_Type := Some_Expr'Reference;
-- (as is sometimes done in Exp_Util.Remove_Side_Effects).
------------------
-- Deref_Suffix --
------------------
function Deref_Suffix return String is
Decl : Node_Id;
begin
if Hide_Temp_Derefs
and then Nkind (Prefix (Expr)) = N_Identifier
and then Nkind (Entity (Prefix (Expr))) =
N_Defining_Identifier
then
Decl := Parent (Entity (Prefix (Expr)));
if Present (Decl)
and then Nkind (Decl) = N_Object_Declaration
and then not Comes_From_Source (Decl)
and then Constant_Present (Decl)
and then Present (Expression (Decl))
and then Nkind (Expression (Decl)) = N_Reference
then
return "";
end if;
end if;
-- The default case
return ".all";
end Deref_Suffix;
-- Start of processing for Explicit_Dereference
begin
if Hide_Parameter_Blocks
and then Nkind (Prefix (Expr)) = N_Selected_Component
and then Present (Etype (Prefix (Expr)))
and then Is_Access_Type (Etype (Prefix (Expr)))
and then Is_Param_Block_Component_Type
(Etype (Prefix (Expr)))
then
-- Return "Foo" instead of "Parameter_Block.Foo.all"
return Expr_Name (Selector_Name (Prefix (Expr)));
elsif Take_Prefix then
return Expr_Name (Prefix (Expr)) & Deref_Suffix;
else
return Deref_Suffix;
end if;
end Explicit_Dereference;
when N_Expanded_Name
| N_Selected_Component
=>
if Take_Prefix then
return
Expr_Name (Prefix (Expr)) & "." &
Expr_Name (Selector_Name (Expr));
else
return "." & Expr_Name (Selector_Name (Expr));
end if;
when N_Component_Association =>
return "("
& List_Name
(List => First (Choices (Expr)),
Add_Space => False,
Add_Paren => False)
& " => " & Expr_Name (Expression (Expr)) & ")";
when N_If_Expression =>
declare
Cond_Expr : constant Node_Id := First (Expressions (Expr));
Then_Expr : constant Node_Id := Next (Cond_Expr);
Else_Expr : constant Node_Id := Next (Then_Expr);
begin
return
"if " & Expr_Name (Cond_Expr) & " then "
& Expr_Name (Then_Expr) & " else "
& Expr_Name (Else_Expr);
end;
when N_Qualified_Expression =>
declare
Mark : constant String :=
Expr_Name
(Subtype_Mark (Expr), Expand_Type => False);
Str : constant String := Expr_Name (Expression (Expr));
begin
if Str (Str'First) = '(' and then Str (Str'Last) = ')' then
return Mark & "'" & Str;
else
return Mark & "'(" & Str & ")";
end if;
end;
when N_Expression_With_Actions
| N_Unchecked_Expression
=>
return Expr_Name (Expression (Expr));
when N_Raise_Constraint_Error =>
if Present (Condition (Expr)) then
return
"[constraint_error when "
& Expr_Name (Condition (Expr)) & "]";
else
return "[constraint_error]";
end if;
when N_Raise_Program_Error =>
if Present (Condition (Expr)) then
return
"[program_error when "
& Expr_Name (Condition (Expr)) & "]";
else
return "[program_error]";
end if;
when N_Range =>
return
Expr_Name (Low_Bound (Expr)) & ".." &
Expr_Name (High_Bound (Expr));
when N_Slice =>
return
Expr_Name (Prefix (Expr)) & " (" &
Expr_Name (Discrete_Range (Expr)) & ")";
when N_And_Then =>
return
Expr_Name (Left_Opnd (Expr)) & " and then " &
Expr_Name (Right_Opnd (Expr));
when N_In =>
return
Expr_Name (Left_Opnd (Expr)) & " in " &
Expr_Name (Right_Opnd (Expr));
when N_Not_In =>
return
Expr_Name (Left_Opnd (Expr)) & " not in " &
Expr_Name (Right_Opnd (Expr));
when N_Or_Else =>
return
Expr_Name (Left_Opnd (Expr)) & " or else " &
Expr_Name (Right_Opnd (Expr));
when N_Op_And =>
return
Expr_Name (Left_Opnd (Expr)) & " and " &
Expr_Name (Right_Opnd (Expr));
when N_Op_Or =>
return
Expr_Name (Left_Opnd (Expr)) & " or " &
Expr_Name (Right_Opnd (Expr));
when N_Op_Xor =>
return
Expr_Name (Left_Opnd (Expr)) & " xor " &
Expr_Name (Right_Opnd (Expr));
when N_Op_Eq =>
return
Expr_Name (Left_Opnd (Expr)) & " = " &
Expr_Name (Right_Opnd (Expr));
when N_Op_Ne =>
return
Expr_Name (Left_Opnd (Expr)) & " /= " &
Expr_Name (Right_Opnd (Expr));
when N_Op_Lt =>
return
Expr_Name (Left_Opnd (Expr)) & " < " &
Expr_Name (Right_Opnd (Expr));
when N_Op_Le =>
return
Expr_Name (Left_Opnd (Expr)) & " <= " &
Expr_Name (Right_Opnd (Expr));
when N_Op_Gt =>
return
Expr_Name (Left_Opnd (Expr)) & " > " &
Expr_Name (Right_Opnd (Expr));
when N_Op_Ge =>
return
Expr_Name (Left_Opnd (Expr)) & " >= " &
Expr_Name (Right_Opnd (Expr));
when N_Op_Add =>
return
Expr_Name (Left_Opnd (Expr)) & " + " &
Expr_Name (Right_Opnd (Expr));
when N_Op_Subtract =>
return
Expr_Name (Left_Opnd (Expr)) & " - " &
Expr_Name (Right_Opnd (Expr));
when N_Op_Multiply =>
return
Expr_Name (Left_Opnd (Expr)) & " * " &
Expr_Name (Right_Opnd (Expr));
when N_Op_Divide =>
return
Expr_Name (Left_Opnd (Expr)) & " / " &
Expr_Name (Right_Opnd (Expr));
when N_Op_Mod =>
return
Expr_Name (Left_Opnd (Expr)) & " mod " &
Expr_Name (Right_Opnd (Expr));
when N_Op_Rem =>
return
Expr_Name (Left_Opnd (Expr)) & " rem " &
Expr_Name (Right_Opnd (Expr));
when N_Op_Expon =>
return
Expr_Name (Left_Opnd (Expr)) & " ** " &
Expr_Name (Right_Opnd (Expr));
when N_Op_Shift_Left =>
return
Expr_Name (Left_Opnd (Expr)) & " << " &
Expr_Name (Right_Opnd (Expr));
when N_Op_Shift_Right | N_Op_Shift_Right_Arithmetic =>
return
Expr_Name (Left_Opnd (Expr)) & " >> " &
Expr_Name (Right_Opnd (Expr));
when N_Op_Concat =>
return
Expr_Name (Left_Opnd (Expr)) & " & " &
Expr_Name (Right_Opnd (Expr));
when N_Op_Plus =>
return "+" & Expr_Name (Right_Opnd (Expr));
when N_Op_Minus =>
return "-" & Expr_Name (Right_Opnd (Expr));
when N_Op_Abs =>
return "abs " & Expr_Name (Right_Opnd (Expr));
when N_Op_Not =>
return "not (" & Expr_Name (Right_Opnd (Expr)) & ")";
when N_Parameter_Association =>
return Expr_Name (Explicit_Actual_Parameter (Expr));
when N_Type_Conversion =>
-- Most conversions are not very interesting (used inside
-- expanded checks to convert to larger ranges), so skip them.
return Expr_Name (Expression (Expr));
when N_Unchecked_Type_Conversion =>
-- Only keep the type conversion in complex cases
if not Is_Scalar_Type (Etype (Expr))
or else not Is_Scalar_Type (Etype (Expression (Expr)))
or else Is_Modular_Integer_Type (Etype (Expr)) /=
Is_Modular_Integer_Type (Etype (Expression (Expr)))
then
return Expr_Name (Subtype_Mark (Expr)) &
"(" & Expr_Name (Expression (Expr)) & ")";
else
return Expr_Name (Expression (Expr));
end if;
when N_Indexed_Component =>
if Take_Prefix then
return
Expr_Name (Prefix (Expr))
& List_Name (First (Expressions (Expr)));
else
return List_Name (First (Expressions (Expr)));
end if;
when N_Function_Call =>
-- If Default = "", it means we're expanding the name of
-- a gnat temporary (and not really a function call), so add
-- parentheses around function call to mark it specially.
if Default = "" then
return '('
& Expr_Name (Name (Expr))
& List_Name (First (Parameter_Associations (Expr)))
& ')';
else
return
Expr_Name (Name (Expr))
& List_Name (First (Parameter_Associations (Expr)));
end if;
when N_Null =>
return "null";
when N_Others_Choice =>
return "others";
when others =>
return "...";
end case;
end Expr_Name;
-- Start of processing for Expression_Image
begin
if not From_Source then
declare
S : constant String := Expr_Name (Expr);
begin
if S = "..." then
return Default;
else
return S;
end if;
end;
end if;
-- Reach to the underlying expression for an expression-with-actions
if Nkind (Expr) = N_Expression_With_Actions then
return Expression_Image (Expression (Expr), Default);
end if;
-- Compute left (start) and right (end) slocs for the expression
-- Consider using Sinput.Sloc_Range instead, except that it does not
-- work properly currently???
loop
case Nkind (Left) is
when N_And_Then
| N_Binary_Op
| N_Membership_Test
| N_Or_Else
=>
Left := Original_Node (Left_Opnd (Left));
when N_Attribute_Reference
| N_Expanded_Name
| N_Explicit_Dereference
| N_Indexed_Component
| N_Reference
| N_Selected_Component
| N_Slice
=>
Left := Original_Node (Prefix (Left));
when N_Defining_Program_Unit_Name
| N_Designator
| N_Function_Call
=>
Left := Original_Node (Name (Left));
when N_Range =>
Left := Original_Node (Low_Bound (Left));
when N_Qualified_Expression
| N_Type_Conversion
=>
Left := Original_Node (Subtype_Mark (Left));
-- For any other item, quit loop
when others =>
exit;
end case;
end loop;
loop
case Nkind (Right) is
when N_And_Then
| N_Membership_Test
| N_Op
| N_Or_Else
=>
Right := Original_Node (Right_Opnd (Right));
when N_Expanded_Name
| N_Selected_Component
=>
Right := Original_Node (Selector_Name (Right));
when N_Qualified_Expression
| N_Type_Conversion
=>
Right := Original_Node (Expression (Right));
-- If argument does not already account for a closing
-- parenthesis, count one here.
if Nkind (Right) not in N_Aggregate | N_Quantified_Expression
then
Append_Paren := Append_Paren + 1;
end if;
when N_Designator =>
Right := Original_Node (Identifier (Right));
when N_Defining_Program_Unit_Name =>
Right := Original_Node (Defining_Identifier (Right));
when N_Range =>
Right := Original_Node (High_Bound (Right));
when N_Parameter_Association =>
Right := Original_Node (Explicit_Actual_Parameter (Right));
when N_Component_Association =>
if Present (Expression (Right)) then
Right := Expression (Right);
else
Right := Last (Choices (Right));
end if;
when N_Indexed_Component =>
Right := Original_Node (Last (Expressions (Right)));
Append_Paren := Append_Paren + 1;
when N_Function_Call =>
if Present (Parameter_Associations (Right)) then
declare
Rover : Node_Id;
Found : Boolean;
begin
-- Avoid source position confusion associated with
-- parameters for which Comes_From_Source is False.
Rover := First (Parameter_Associations (Right));
Found := False;
while Present (Rover) loop
if Comes_From_Source (Original_Node (Rover)) then
Right := Original_Node (Rover);
Found := True;
end if;
Next (Rover);
end loop;
if Found then
Append_Paren := Append_Paren + 1;
end if;
-- Quit loop if no Comes_From_Source parameters
exit when not Found;
end;
-- Quit loop if no parameters
else
exit;
end if;
when N_Quantified_Expression =>
Right := Original_Node (Condition (Right));
Append_Paren := Append_Paren + 1;
when N_Aggregate =>
declare
Aggr : constant Node_Id := Right;
Sub : Node_Id;
begin
Sub := First (Expressions (Aggr));
while Present (Sub) loop
if Sloc (Sub) > Sloc (Right) then
Right := Sub;
end if;
Next (Sub);
end loop;
Sub := First (Component_Associations (Aggr));
while Present (Sub) loop
if Sloc (Sub) > Sloc (Right) then
Right := Sub;
end if;
Next (Sub);
end loop;
exit when Right = Aggr;
Append_Paren := Append_Paren + 1;
end;
-- For all other items, quit the loop
when others =>
exit;
end case;
end loop;
declare
Scn : Source_Ptr := Original_Location (Sloc (Left));
End_Sloc : constant Source_Ptr :=
Original_Location (Sloc (Right));
Src : constant Source_Buffer_Ptr :=
Source_Text (Get_Source_File_Index (Scn));
begin
if Scn > End_Sloc then
return Default;
end if;
declare
Threshold : constant := 256;
Buffer : String (1 .. Natural (End_Sloc - Scn));
Index : Natural := 0;
Skipping_Comment : Boolean := False;
Underscore : Boolean := False;
begin
if Right /= Expr then
while Scn < End_Sloc loop
case Src (Scn) is
-- Give up on non ASCII characters
when Character'Val (128) .. Character'Last =>
Append_Paren := 0;
Index := 0;
Right := Expr;
exit;
when ' '
| ASCII.HT
=>
if not Skipping_Comment and then not Underscore then
Underscore := True;
Index := Index + 1;
Buffer (Index) := ' ';
end if;
-- CR/LF/FF is the end of any comment
when ASCII.CR
| ASCII.FF
| ASCII.LF
=>
Skipping_Comment := False;
when others =>
Underscore := False;
if not Skipping_Comment then
-- Ignore comment
if Src (Scn) = '-' and then Src (Scn + 1) = '-' then
Skipping_Comment := True;
else
Index := Index + 1;
Buffer (Index) := Src (Scn);
end if;
end if;
end case;
-- Give up on too long strings
if Index >= Threshold then
return Buffer (1 .. Index) & "...";
end if;
Scn := Scn + 1;
end loop;
end if;
if Index < 1 then
declare
S : constant String := Expr_Name (Right);
begin
if S = "..." then
return Default;
else
return S;
end if;
end;
else
return
Buffer (1 .. Index)
& Expr_Name (Right, False)
& (1 .. Append_Paren => ')');
end if;
end;
end;
end Expression_Image;
end Pprint;
|
stcarrez/ada-util | Ada | 1,540 | ads | -----------------------------------------------------------------------
-- util-beans-objects-time -- Helper conversion for Ada Calendar Time
-- Copyright (C) 2010, 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 Ada.Calendar;
with Util.Nullables;
package Util.Beans.Objects.Time is
-- Create an object from the given value.
function To_Object (Value : in Ada.Calendar.Time) return Object;
function To_Object (Value : in Nullables.Nullable_Time) return Object;
-- Convert the object into a time.
-- Raises Constraint_Error if the object cannot be converter to the target type.
function To_Time (Value : in Object) return Ada.Calendar.Time;
function To_Time (Value : in Object) return Nullables.Nullable_Time;
-- Force the object to be a time.
function Cast_Time (Value : Object) return Object;
end Util.Beans.Objects.Time;
|
faelys/natools | Ada | 8,144 | adb | ------------------------------------------------------------------------------
-- Copyright (c) 2014, 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. --
------------------------------------------------------------------------------
package body Natools.References.Pools is
------------------------
-- Helper Subprograms --
------------------------
overriding procedure Finalize (Object : in out Pool_Backend) is
begin
Unchecked_Free (Object.Refs);
end Finalize;
procedure Find
(Container : in Pool_Backend;
First_Available : out Extended_Index;
First_Empty : out Extended_Index) is
begin
First_Available := 0;
First_Empty := 0;
if Container.Refs = null then
return;
end if;
for I in Container.Refs'Range loop
if Container.Refs (I).Is_Empty then
if First_Empty = 0 then
First_Empty := I;
exit when First_Available /= 0;
end if;
elsif Container.Refs (I).Is_Last then
if First_Available = 0 then
First_Available := I;
exit when First_Empty /= 0;
end if;
end if;
end loop;
end Find;
not overriding procedure Preallocate
(Container : in out Pool_Backend;
New_Item_Count : in Pool_Size;
Constructor : access function return Held_Data := null) is
begin
if New_Item_Count = 0 then
return;
end if;
if Container.Refs = null then
Container.Refs := new Reference_Array (1 .. New_Item_Count);
if Constructor /= null then
for I in Container.Refs'Range loop
Container.Refs (I) := Create (Constructor);
end loop;
end if;
else
declare
New_Data : Reference_Array_Access
:= new Reference_Array
(1 .. Container.Refs'Length + New_Item_Count);
begin
New_Data (1 .. Container.Refs'Length) := Container.Refs.all;
if Constructor /= null then
for I in Container.Refs'Length + 1 .. New_Data'Last loop
New_Data (I) := Create (Constructor);
end loop;
end if;
Unchecked_Free (Container.Refs);
Container.Refs := New_Data;
exception
when others =>
Unchecked_Free (New_Data);
raise;
end;
end if;
end Preallocate;
----------------------------------
-- Public Protected Subprograms --
----------------------------------
protected body Pool is
procedure Get (Ref : out Reference) is
First_Available, First_Empty : Extended_Index;
begin
Backend.Find (First_Available, First_Empty);
if First_Available in Reference_Index then
Ref := Backend.Refs (First_Available);
else
raise Constraint_Error
with "No non-empty unused reference in pool";
end if;
end Get;
procedure Get
(Constructor : not null access function return Held_Data;
Ref : out Reference)
is
First_Available, First_Empty : Extended_Index;
begin
Backend.Find (First_Available, First_Empty);
if First_Available in Reference_Index then
Ref := Backend.Refs (First_Available);
elsif First_Empty in Reference_Index then
Backend.Refs (First_Empty) := Create (Constructor);
Ref := Backend.Refs (First_Empty);
else
raise Constraint_Error with "No unused reference in pool";
end if;
end Get;
procedure Create
(Constructor : not null access function return Held_Data;
Ref : out Reference;
Expand_Count : in Pool_Size := 1)
is
First_Available, First_Empty : Extended_Index;
begin
Backend.Find (First_Available, First_Empty);
if First_Available in Reference_Index then
Ref := Backend.Refs (First_Available);
elsif First_Empty in Reference_Index then
Backend.Refs (First_Empty) := Create (Constructor);
Ref := Backend.Refs (First_Empty);
else
First_Available := Backend.Length + 1;
Backend.Preallocate (Expand_Count, Constructor);
Ref := Backend.Refs (First_Available);
end if;
end Create;
procedure Preallocate
(New_Item_Count : in Pool_Size;
Constructor : access function return Held_Data := null) is
begin
Backend.Preallocate (New_Item_Count, Constructor);
end Preallocate;
procedure Release_Unused is
begin
if Backend.Refs = null then
return;
end if;
for I in Backend.Refs'Range loop
if not Backend.Refs (I).Is_Empty
and then Backend.Refs (I).Is_Last
then
Backend.Refs (I).Reset;
end if;
end loop;
end Release_Unused;
procedure Trim is
Index : Extended_Index := 0;
New_Count : constant Pool_Size := Initialized_Size;
New_Data : Reference_Array_Access := null;
begin
if New_Count = Backend.Length then
return;
end if;
New_Data := new Reference_Array (1 .. New_Count);
for I in Backend.Refs'Range loop
if not Backend.Refs (I).Is_Empty then
Index := Index + 1;
New_Data (Index) := Backend.Refs (I);
end if;
end loop;
pragma Assert (Index = New_Count);
Unchecked_Free (Backend.Refs);
Backend.Refs := New_Data;
exception
when others =>
Unchecked_Free (New_Data);
raise;
end Trim;
procedure Purge is
begin
Release_Unused;
Trim;
end Purge;
function Capacity return Pool_Size is
begin
return Backend.Length;
end Capacity;
function Initialized_Size return Pool_Size is
Result : Pool_Size := 0;
begin
if Backend.Refs /= null then
for I in Backend.Refs'Range loop
if not Backend.Refs (I).Is_Empty then
Result := Result + 1;
end if;
end loop;
end if;
return Result;
end Initialized_Size;
function Active_Size return Pool_Size is
Result : Pool_Size := 0;
begin
if Backend.Refs /= null then
for I in Backend.Refs'Range loop
if not Backend.Refs (I).Is_Empty
and then not Backend.Refs (I).Is_Last
then
Result := Result + 1;
end if;
end loop;
end if;
return Result;
end Active_Size;
procedure Unchecked_Iterate
(Process : not null access procedure (Ref : in Reference)) is
begin
for I in Backend.Refs'Range loop
Process.all (Backend.Refs (I));
end loop;
end Unchecked_Iterate;
end Pool;
end Natools.References.Pools;
|
ecalderini/bingada | Ada | 365 | ads | --*****************************************************************************
--*
--* PROJECT: BINGADA
--*
--* FILE: q_bingada.ads
--*
--* AUTHOR: Javier Fuica Fernadez
--*
--*****************************************************************************
package Q_BINGADA is
procedure P_CREATE_WIDGETS;
end Q_BINGADA;
|
ekoeppen/STM32_Generic_Ada_Drivers | Ada | 80,373 | ads | -- This spec has been automatically generated from STM32F411xx.svd
pragma Restrictions (No_Elaboration_Code);
pragma Ada_2012;
pragma Style_Checks (Off);
with System;
package STM32_SVD.TIM is
pragma Preelaborate;
---------------
-- Registers --
---------------
subtype CR1_CEN_Field is STM32_SVD.Bit;
subtype CR1_UDIS_Field is STM32_SVD.Bit;
subtype CR1_URS_Field is STM32_SVD.Bit;
subtype CR1_OPM_Field is STM32_SVD.Bit;
subtype CR1_DIR_Field is STM32_SVD.Bit;
subtype CR1_CMS_Field is STM32_SVD.UInt2;
subtype CR1_ARPE_Field is STM32_SVD.Bit;
subtype CR1_CKD_Field is STM32_SVD.UInt2;
-- control register 1
type CR1_Register is record
-- Counter enable
CEN : CR1_CEN_Field := 16#0#;
-- Update disable
UDIS : CR1_UDIS_Field := 16#0#;
-- Update request source
URS : CR1_URS_Field := 16#0#;
-- One-pulse mode
OPM : CR1_OPM_Field := 16#0#;
-- Direction
DIR : CR1_DIR_Field := 16#0#;
-- Center-aligned mode selection
CMS : CR1_CMS_Field := 16#0#;
-- Auto-reload preload enable
ARPE : CR1_ARPE_Field := 16#0#;
-- Clock division
CKD : CR1_CKD_Field := 16#0#;
-- unspecified
Reserved_10_31 : STM32_SVD.UInt22 := 16#0#;
end record
with Volatile_Full_Access, Size => 32,
Bit_Order => System.Low_Order_First;
for CR1_Register use record
CEN at 0 range 0 .. 0;
UDIS at 0 range 1 .. 1;
URS at 0 range 2 .. 2;
OPM at 0 range 3 .. 3;
DIR at 0 range 4 .. 4;
CMS at 0 range 5 .. 6;
ARPE at 0 range 7 .. 7;
CKD at 0 range 8 .. 9;
Reserved_10_31 at 0 range 10 .. 31;
end record;
subtype CR2_CCPC_Field is STM32_SVD.Bit;
subtype CR2_CCUS_Field is STM32_SVD.Bit;
subtype CR2_CCDS_Field is STM32_SVD.Bit;
subtype CR2_MMS_Field is STM32_SVD.UInt3;
subtype CR2_TI1S_Field is STM32_SVD.Bit;
subtype CR2_OIS1_Field is STM32_SVD.Bit;
subtype CR2_OIS1N_Field is STM32_SVD.Bit;
subtype CR2_OIS2_Field is STM32_SVD.Bit;
subtype CR2_OIS2N_Field is STM32_SVD.Bit;
subtype CR2_OIS3_Field is STM32_SVD.Bit;
subtype CR2_OIS3N_Field is STM32_SVD.Bit;
subtype CR2_OIS4_Field is STM32_SVD.Bit;
-- control register 2
type CR2_Register is record
-- Capture/compare preloaded control
CCPC : CR2_CCPC_Field := 16#0#;
-- unspecified
Reserved_1_1 : STM32_SVD.Bit := 16#0#;
-- Capture/compare control update selection
CCUS : CR2_CCUS_Field := 16#0#;
-- Capture/compare DMA selection
CCDS : CR2_CCDS_Field := 16#0#;
-- Master mode selection
MMS : CR2_MMS_Field := 16#0#;
-- TI1 selection
TI1S : CR2_TI1S_Field := 16#0#;
-- Output Idle state 1
OIS1 : CR2_OIS1_Field := 16#0#;
-- Output Idle state 1
OIS1N : CR2_OIS1N_Field := 16#0#;
-- Output Idle state 2
OIS2 : CR2_OIS2_Field := 16#0#;
-- Output Idle state 2
OIS2N : CR2_OIS2N_Field := 16#0#;
-- Output Idle state 3
OIS3 : CR2_OIS3_Field := 16#0#;
-- Output Idle state 3
OIS3N : CR2_OIS3N_Field := 16#0#;
-- Output Idle state 4
OIS4 : CR2_OIS4_Field := 16#0#;
-- unspecified
Reserved_15_31 : STM32_SVD.UInt17 := 16#0#;
end record
with Volatile_Full_Access, Size => 32,
Bit_Order => System.Low_Order_First;
for CR2_Register use record
CCPC at 0 range 0 .. 0;
Reserved_1_1 at 0 range 1 .. 1;
CCUS at 0 range 2 .. 2;
CCDS at 0 range 3 .. 3;
MMS at 0 range 4 .. 6;
TI1S at 0 range 7 .. 7;
OIS1 at 0 range 8 .. 8;
OIS1N at 0 range 9 .. 9;
OIS2 at 0 range 10 .. 10;
OIS2N at 0 range 11 .. 11;
OIS3 at 0 range 12 .. 12;
OIS3N at 0 range 13 .. 13;
OIS4 at 0 range 14 .. 14;
Reserved_15_31 at 0 range 15 .. 31;
end record;
subtype SMCR_SMS_Field is STM32_SVD.UInt3;
subtype SMCR_TS_Field is STM32_SVD.UInt3;
subtype SMCR_MSM_Field is STM32_SVD.Bit;
subtype SMCR_ETF_Field is STM32_SVD.UInt4;
subtype SMCR_ETPS_Field is STM32_SVD.UInt2;
subtype SMCR_ECE_Field is STM32_SVD.Bit;
subtype SMCR_ETP_Field is STM32_SVD.Bit;
-- slave mode control register
type SMCR_Register is record
-- Slave mode selection
SMS : SMCR_SMS_Field := 16#0#;
-- unspecified
Reserved_3_3 : STM32_SVD.Bit := 16#0#;
-- Trigger selection
TS : SMCR_TS_Field := 16#0#;
-- Master/Slave mode
MSM : SMCR_MSM_Field := 16#0#;
-- External trigger filter
ETF : SMCR_ETF_Field := 16#0#;
-- External trigger prescaler
ETPS : SMCR_ETPS_Field := 16#0#;
-- External clock enable
ECE : SMCR_ECE_Field := 16#0#;
-- External trigger polarity
ETP : SMCR_ETP_Field := 16#0#;
-- unspecified
Reserved_16_31 : STM32_SVD.UInt16 := 16#0#;
end record
with Volatile_Full_Access, Size => 32,
Bit_Order => System.Low_Order_First;
for SMCR_Register use record
SMS at 0 range 0 .. 2;
Reserved_3_3 at 0 range 3 .. 3;
TS at 0 range 4 .. 6;
MSM at 0 range 7 .. 7;
ETF at 0 range 8 .. 11;
ETPS at 0 range 12 .. 13;
ECE at 0 range 14 .. 14;
ETP at 0 range 15 .. 15;
Reserved_16_31 at 0 range 16 .. 31;
end record;
subtype DIER_UIE_Field is STM32_SVD.Bit;
subtype DIER_CC1IE_Field is STM32_SVD.Bit;
subtype DIER_CC2IE_Field is STM32_SVD.Bit;
subtype DIER_CC3IE_Field is STM32_SVD.Bit;
subtype DIER_CC4IE_Field is STM32_SVD.Bit;
subtype DIER_COMIE_Field is STM32_SVD.Bit;
subtype DIER_TIE_Field is STM32_SVD.Bit;
subtype DIER_BIE_Field is STM32_SVD.Bit;
subtype DIER_UDE_Field is STM32_SVD.Bit;
subtype DIER_CC1DE_Field is STM32_SVD.Bit;
subtype DIER_CC2DE_Field is STM32_SVD.Bit;
subtype DIER_CC3DE_Field is STM32_SVD.Bit;
subtype DIER_CC4DE_Field is STM32_SVD.Bit;
subtype DIER_COMDE_Field is STM32_SVD.Bit;
subtype DIER_TDE_Field is STM32_SVD.Bit;
-- DMA/Interrupt enable register
type DIER_Register is record
-- Update interrupt enable
UIE : DIER_UIE_Field := 16#0#;
-- Capture/Compare 1 interrupt enable
CC1IE : DIER_CC1IE_Field := 16#0#;
-- Capture/Compare 2 interrupt enable
CC2IE : DIER_CC2IE_Field := 16#0#;
-- Capture/Compare 3 interrupt enable
CC3IE : DIER_CC3IE_Field := 16#0#;
-- Capture/Compare 4 interrupt enable
CC4IE : DIER_CC4IE_Field := 16#0#;
-- COM interrupt enable
COMIE : DIER_COMIE_Field := 16#0#;
-- Trigger interrupt enable
TIE : DIER_TIE_Field := 16#0#;
-- Break interrupt enable
BIE : DIER_BIE_Field := 16#0#;
-- Update DMA request enable
UDE : DIER_UDE_Field := 16#0#;
-- Capture/Compare 1 DMA request enable
CC1DE : DIER_CC1DE_Field := 16#0#;
-- Capture/Compare 2 DMA request enable
CC2DE : DIER_CC2DE_Field := 16#0#;
-- Capture/Compare 3 DMA request enable
CC3DE : DIER_CC3DE_Field := 16#0#;
-- Capture/Compare 4 DMA request enable
CC4DE : DIER_CC4DE_Field := 16#0#;
-- COM DMA request enable
COMDE : DIER_COMDE_Field := 16#0#;
-- Trigger DMA request enable
TDE : DIER_TDE_Field := 16#0#;
-- unspecified
Reserved_15_31 : STM32_SVD.UInt17 := 16#0#;
end record
with Volatile_Full_Access, Size => 32,
Bit_Order => System.Low_Order_First;
for DIER_Register use record
UIE at 0 range 0 .. 0;
CC1IE at 0 range 1 .. 1;
CC2IE at 0 range 2 .. 2;
CC3IE at 0 range 3 .. 3;
CC4IE at 0 range 4 .. 4;
COMIE at 0 range 5 .. 5;
TIE at 0 range 6 .. 6;
BIE at 0 range 7 .. 7;
UDE at 0 range 8 .. 8;
CC1DE at 0 range 9 .. 9;
CC2DE at 0 range 10 .. 10;
CC3DE at 0 range 11 .. 11;
CC4DE at 0 range 12 .. 12;
COMDE at 0 range 13 .. 13;
TDE at 0 range 14 .. 14;
Reserved_15_31 at 0 range 15 .. 31;
end record;
subtype SR_UIF_Field is STM32_SVD.Bit;
subtype SR_CC1IF_Field is STM32_SVD.Bit;
subtype SR_CC2IF_Field is STM32_SVD.Bit;
subtype SR_CC3IF_Field is STM32_SVD.Bit;
subtype SR_CC4IF_Field is STM32_SVD.Bit;
subtype SR_COMIF_Field is STM32_SVD.Bit;
subtype SR_TIF_Field is STM32_SVD.Bit;
subtype SR_BIF_Field is STM32_SVD.Bit;
subtype SR_CC1OF_Field is STM32_SVD.Bit;
subtype SR_CC2OF_Field is STM32_SVD.Bit;
subtype SR_CC3OF_Field is STM32_SVD.Bit;
subtype SR_CC4OF_Field is STM32_SVD.Bit;
-- status register
type SR_Register is record
-- Update interrupt flag
UIF : SR_UIF_Field := 16#0#;
-- Capture/compare 1 interrupt flag
CC1IF : SR_CC1IF_Field := 16#0#;
-- Capture/Compare 2 interrupt flag
CC2IF : SR_CC2IF_Field := 16#0#;
-- Capture/Compare 3 interrupt flag
CC3IF : SR_CC3IF_Field := 16#0#;
-- Capture/Compare 4 interrupt flag
CC4IF : SR_CC4IF_Field := 16#0#;
-- COM interrupt flag
COMIF : SR_COMIF_Field := 16#0#;
-- Trigger interrupt flag
TIF : SR_TIF_Field := 16#0#;
-- Break interrupt flag
BIF : SR_BIF_Field := 16#0#;
-- unspecified
Reserved_8_8 : STM32_SVD.Bit := 16#0#;
-- Capture/Compare 1 overcapture flag
CC1OF : SR_CC1OF_Field := 16#0#;
-- Capture/compare 2 overcapture flag
CC2OF : SR_CC2OF_Field := 16#0#;
-- Capture/Compare 3 overcapture flag
CC3OF : SR_CC3OF_Field := 16#0#;
-- Capture/Compare 4 overcapture flag
CC4OF : SR_CC4OF_Field := 16#0#;
-- unspecified
Reserved_13_31 : STM32_SVD.UInt19 := 16#0#;
end record
with Volatile_Full_Access, Size => 32,
Bit_Order => System.Low_Order_First;
for SR_Register use record
UIF at 0 range 0 .. 0;
CC1IF at 0 range 1 .. 1;
CC2IF at 0 range 2 .. 2;
CC3IF at 0 range 3 .. 3;
CC4IF at 0 range 4 .. 4;
COMIF at 0 range 5 .. 5;
TIF at 0 range 6 .. 6;
BIF at 0 range 7 .. 7;
Reserved_8_8 at 0 range 8 .. 8;
CC1OF at 0 range 9 .. 9;
CC2OF at 0 range 10 .. 10;
CC3OF at 0 range 11 .. 11;
CC4OF at 0 range 12 .. 12;
Reserved_13_31 at 0 range 13 .. 31;
end record;
subtype EGR_UG_Field is STM32_SVD.Bit;
subtype EGR_CC1G_Field is STM32_SVD.Bit;
subtype EGR_CC2G_Field is STM32_SVD.Bit;
subtype EGR_CC3G_Field is STM32_SVD.Bit;
subtype EGR_CC4G_Field is STM32_SVD.Bit;
subtype EGR_COMG_Field is STM32_SVD.Bit;
subtype EGR_TG_Field is STM32_SVD.Bit;
subtype EGR_BG_Field is STM32_SVD.Bit;
-- event generation register
type EGR_Register is record
-- Write-only. Update generation
UG : EGR_UG_Field := 16#0#;
-- Write-only. Capture/compare 1 generation
CC1G : EGR_CC1G_Field := 16#0#;
-- Write-only. Capture/compare 2 generation
CC2G : EGR_CC2G_Field := 16#0#;
-- Write-only. Capture/compare 3 generation
CC3G : EGR_CC3G_Field := 16#0#;
-- Write-only. Capture/compare 4 generation
CC4G : EGR_CC4G_Field := 16#0#;
-- Write-only. Capture/Compare control update generation
COMG : EGR_COMG_Field := 16#0#;
-- Write-only. Trigger generation
TG : EGR_TG_Field := 16#0#;
-- Write-only. Break generation
BG : EGR_BG_Field := 16#0#;
-- unspecified
Reserved_8_31 : STM32_SVD.UInt24 := 16#0#;
end record
with Volatile_Full_Access, Size => 32,
Bit_Order => System.Low_Order_First;
for EGR_Register use record
UG at 0 range 0 .. 0;
CC1G at 0 range 1 .. 1;
CC2G at 0 range 2 .. 2;
CC3G at 0 range 3 .. 3;
CC4G at 0 range 4 .. 4;
COMG at 0 range 5 .. 5;
TG at 0 range 6 .. 6;
BG at 0 range 7 .. 7;
Reserved_8_31 at 0 range 8 .. 31;
end record;
subtype CCMR1_Output_CC1S_Field is STM32_SVD.UInt2;
subtype CCMR1_Output_OC1FE_Field is STM32_SVD.Bit;
subtype CCMR1_Output_OC1PE_Field is STM32_SVD.Bit;
subtype CCMR1_Output_OC1M_Field is STM32_SVD.UInt3;
subtype CCMR1_Output_OC1CE_Field is STM32_SVD.Bit;
subtype CCMR1_Output_CC2S_Field is STM32_SVD.UInt2;
subtype CCMR1_Output_OC2FE_Field is STM32_SVD.Bit;
subtype CCMR1_Output_OC2PE_Field is STM32_SVD.Bit;
subtype CCMR1_Output_OC2M_Field is STM32_SVD.UInt3;
subtype CCMR1_Output_OC2CE_Field is STM32_SVD.Bit;
-- capture/compare mode register 1 (output mode)
type CCMR1_Output_Register is record
-- Capture/Compare 1 selection
CC1S : CCMR1_Output_CC1S_Field := 16#0#;
-- Output Compare 1 fast enable
OC1FE : CCMR1_Output_OC1FE_Field := 16#0#;
-- Output Compare 1 preload enable
OC1PE : CCMR1_Output_OC1PE_Field := 16#0#;
-- Output Compare 1 mode
OC1M : CCMR1_Output_OC1M_Field := 16#0#;
-- Output Compare 1 clear enable
OC1CE : CCMR1_Output_OC1CE_Field := 16#0#;
-- Capture/Compare 2 selection
CC2S : CCMR1_Output_CC2S_Field := 16#0#;
-- Output Compare 2 fast enable
OC2FE : CCMR1_Output_OC2FE_Field := 16#0#;
-- Output Compare 2 preload enable
OC2PE : CCMR1_Output_OC2PE_Field := 16#0#;
-- Output Compare 2 mode
OC2M : CCMR1_Output_OC2M_Field := 16#0#;
-- Output Compare 2 clear enable
OC2CE : CCMR1_Output_OC2CE_Field := 16#0#;
-- unspecified
Reserved_16_31 : STM32_SVD.UInt16 := 16#0#;
end record
with Volatile_Full_Access, Size => 32,
Bit_Order => System.Low_Order_First;
for CCMR1_Output_Register use record
CC1S at 0 range 0 .. 1;
OC1FE at 0 range 2 .. 2;
OC1PE at 0 range 3 .. 3;
OC1M at 0 range 4 .. 6;
OC1CE at 0 range 7 .. 7;
CC2S at 0 range 8 .. 9;
OC2FE at 0 range 10 .. 10;
OC2PE at 0 range 11 .. 11;
OC2M at 0 range 12 .. 14;
OC2CE at 0 range 15 .. 15;
Reserved_16_31 at 0 range 16 .. 31;
end record;
subtype CCMR1_Input_CC1S_Field is STM32_SVD.UInt2;
subtype CCMR1_Input_ICPCS_Field is STM32_SVD.UInt2;
subtype CCMR1_Input_IC1F_Field is STM32_SVD.UInt4;
subtype CCMR1_Input_CC2S_Field is STM32_SVD.UInt2;
subtype CCMR1_Input_IC2PCS_Field is STM32_SVD.UInt2;
subtype CCMR1_Input_IC2F_Field is STM32_SVD.UInt4;
-- capture/compare mode register 1 (input mode)
type CCMR1_Input_Register is record
-- Capture/Compare 1 selection
CC1S : CCMR1_Input_CC1S_Field := 16#0#;
-- Input capture 1 prescaler
ICPCS : CCMR1_Input_ICPCS_Field := 16#0#;
-- Input capture 1 filter
IC1F : CCMR1_Input_IC1F_Field := 16#0#;
-- Capture/Compare 2 selection
CC2S : CCMR1_Input_CC2S_Field := 16#0#;
-- Input capture 2 prescaler
IC2PCS : CCMR1_Input_IC2PCS_Field := 16#0#;
-- Input capture 2 filter
IC2F : CCMR1_Input_IC2F_Field := 16#0#;
-- unspecified
Reserved_16_31 : STM32_SVD.UInt16 := 16#0#;
end record
with Volatile_Full_Access, Size => 32,
Bit_Order => System.Low_Order_First;
for CCMR1_Input_Register use record
CC1S at 0 range 0 .. 1;
ICPCS at 0 range 2 .. 3;
IC1F at 0 range 4 .. 7;
CC2S at 0 range 8 .. 9;
IC2PCS at 0 range 10 .. 11;
IC2F at 0 range 12 .. 15;
Reserved_16_31 at 0 range 16 .. 31;
end record;
subtype CCMR2_Output_CC3S_Field is STM32_SVD.UInt2;
subtype CCMR2_Output_OC3FE_Field is STM32_SVD.Bit;
subtype CCMR2_Output_OC3PE_Field is STM32_SVD.Bit;
subtype CCMR2_Output_OC3M_Field is STM32_SVD.UInt3;
subtype CCMR2_Output_OC3CE_Field is STM32_SVD.Bit;
subtype CCMR2_Output_CC4S_Field is STM32_SVD.UInt2;
subtype CCMR2_Output_OC4FE_Field is STM32_SVD.Bit;
subtype CCMR2_Output_OC4PE_Field is STM32_SVD.Bit;
subtype CCMR2_Output_OC4M_Field is STM32_SVD.UInt3;
subtype CCMR2_Output_OC4CE_Field is STM32_SVD.Bit;
-- capture/compare mode register 2 (output mode)
type CCMR2_Output_Register is record
-- Capture/Compare 3 selection
CC3S : CCMR2_Output_CC3S_Field := 16#0#;
-- Output compare 3 fast enable
OC3FE : CCMR2_Output_OC3FE_Field := 16#0#;
-- Output compare 3 preload enable
OC3PE : CCMR2_Output_OC3PE_Field := 16#0#;
-- Output compare 3 mode
OC3M : CCMR2_Output_OC3M_Field := 16#0#;
-- Output compare 3 clear enable
OC3CE : CCMR2_Output_OC3CE_Field := 16#0#;
-- Capture/Compare 4 selection
CC4S : CCMR2_Output_CC4S_Field := 16#0#;
-- Output compare 4 fast enable
OC4FE : CCMR2_Output_OC4FE_Field := 16#0#;
-- Output compare 4 preload enable
OC4PE : CCMR2_Output_OC4PE_Field := 16#0#;
-- Output compare 4 mode
OC4M : CCMR2_Output_OC4M_Field := 16#0#;
-- Output compare 4 clear enable
OC4CE : CCMR2_Output_OC4CE_Field := 16#0#;
-- unspecified
Reserved_16_31 : STM32_SVD.UInt16 := 16#0#;
end record
with Volatile_Full_Access, Size => 32,
Bit_Order => System.Low_Order_First;
for CCMR2_Output_Register use record
CC3S at 0 range 0 .. 1;
OC3FE at 0 range 2 .. 2;
OC3PE at 0 range 3 .. 3;
OC3M at 0 range 4 .. 6;
OC3CE at 0 range 7 .. 7;
CC4S at 0 range 8 .. 9;
OC4FE at 0 range 10 .. 10;
OC4PE at 0 range 11 .. 11;
OC4M at 0 range 12 .. 14;
OC4CE at 0 range 15 .. 15;
Reserved_16_31 at 0 range 16 .. 31;
end record;
subtype CCMR2_Input_CC3S_Field is STM32_SVD.UInt2;
subtype CCMR2_Input_IC3PSC_Field is STM32_SVD.UInt2;
subtype CCMR2_Input_IC3F_Field is STM32_SVD.UInt4;
subtype CCMR2_Input_CC4S_Field is STM32_SVD.UInt2;
subtype CCMR2_Input_IC4PSC_Field is STM32_SVD.UInt2;
subtype CCMR2_Input_IC4F_Field is STM32_SVD.UInt4;
-- capture/compare mode register 2 (input mode)
type CCMR2_Input_Register is record
-- Capture/compare 3 selection
CC3S : CCMR2_Input_CC3S_Field := 16#0#;
-- Input capture 3 prescaler
IC3PSC : CCMR2_Input_IC3PSC_Field := 16#0#;
-- Input capture 3 filter
IC3F : CCMR2_Input_IC3F_Field := 16#0#;
-- Capture/Compare 4 selection
CC4S : CCMR2_Input_CC4S_Field := 16#0#;
-- Input capture 4 prescaler
IC4PSC : CCMR2_Input_IC4PSC_Field := 16#0#;
-- Input capture 4 filter
IC4F : CCMR2_Input_IC4F_Field := 16#0#;
-- unspecified
Reserved_16_31 : STM32_SVD.UInt16 := 16#0#;
end record
with Volatile_Full_Access, Size => 32,
Bit_Order => System.Low_Order_First;
for CCMR2_Input_Register use record
CC3S at 0 range 0 .. 1;
IC3PSC at 0 range 2 .. 3;
IC3F at 0 range 4 .. 7;
CC4S at 0 range 8 .. 9;
IC4PSC at 0 range 10 .. 11;
IC4F at 0 range 12 .. 15;
Reserved_16_31 at 0 range 16 .. 31;
end record;
subtype CCER_CC1E_Field is STM32_SVD.Bit;
subtype CCER_CC1P_Field is STM32_SVD.Bit;
subtype CCER_CC1NE_Field is STM32_SVD.Bit;
subtype CCER_CC1NP_Field is STM32_SVD.Bit;
subtype CCER_CC2E_Field is STM32_SVD.Bit;
subtype CCER_CC2P_Field is STM32_SVD.Bit;
subtype CCER_CC2NE_Field is STM32_SVD.Bit;
subtype CCER_CC2NP_Field is STM32_SVD.Bit;
subtype CCER_CC3E_Field is STM32_SVD.Bit;
subtype CCER_CC3P_Field is STM32_SVD.Bit;
subtype CCER_CC3NE_Field is STM32_SVD.Bit;
subtype CCER_CC3NP_Field is STM32_SVD.Bit;
subtype CCER_CC4E_Field is STM32_SVD.Bit;
subtype CCER_CC4P_Field is STM32_SVD.Bit;
-- capture/compare enable register
type CCER_Register is record
-- Capture/Compare 1 output enable
CC1E : CCER_CC1E_Field := 16#0#;
-- Capture/Compare 1 output Polarity
CC1P : CCER_CC1P_Field := 16#0#;
-- Capture/Compare 1 complementary output enable
CC1NE : CCER_CC1NE_Field := 16#0#;
-- Capture/Compare 1 output Polarity
CC1NP : CCER_CC1NP_Field := 16#0#;
-- Capture/Compare 2 output enable
CC2E : CCER_CC2E_Field := 16#0#;
-- Capture/Compare 2 output Polarity
CC2P : CCER_CC2P_Field := 16#0#;
-- Capture/Compare 2 complementary output enable
CC2NE : CCER_CC2NE_Field := 16#0#;
-- Capture/Compare 2 output Polarity
CC2NP : CCER_CC2NP_Field := 16#0#;
-- Capture/Compare 3 output enable
CC3E : CCER_CC3E_Field := 16#0#;
-- Capture/Compare 3 output Polarity
CC3P : CCER_CC3P_Field := 16#0#;
-- Capture/Compare 3 complementary output enable
CC3NE : CCER_CC3NE_Field := 16#0#;
-- Capture/Compare 3 output Polarity
CC3NP : CCER_CC3NP_Field := 16#0#;
-- Capture/Compare 4 output enable
CC4E : CCER_CC4E_Field := 16#0#;
-- Capture/Compare 3 output Polarity
CC4P : CCER_CC4P_Field := 16#0#;
-- unspecified
Reserved_14_31 : STM32_SVD.UInt18 := 16#0#;
end record
with Volatile_Full_Access, Size => 32,
Bit_Order => System.Low_Order_First;
for CCER_Register use record
CC1E at 0 range 0 .. 0;
CC1P at 0 range 1 .. 1;
CC1NE at 0 range 2 .. 2;
CC1NP at 0 range 3 .. 3;
CC2E at 0 range 4 .. 4;
CC2P at 0 range 5 .. 5;
CC2NE at 0 range 6 .. 6;
CC2NP at 0 range 7 .. 7;
CC3E at 0 range 8 .. 8;
CC3P at 0 range 9 .. 9;
CC3NE at 0 range 10 .. 10;
CC3NP at 0 range 11 .. 11;
CC4E at 0 range 12 .. 12;
CC4P at 0 range 13 .. 13;
Reserved_14_31 at 0 range 14 .. 31;
end record;
subtype CNT_CNT_Field is STM32_SVD.UInt16;
-- counter
type CNT_Register is record
-- counter value
CNT : CNT_CNT_Field := 16#0#;
-- unspecified
Reserved_16_31 : STM32_SVD.UInt16 := 16#0#;
end record
with Volatile_Full_Access, Size => 32,
Bit_Order => System.Low_Order_First;
for CNT_Register use record
CNT at 0 range 0 .. 15;
Reserved_16_31 at 0 range 16 .. 31;
end record;
subtype PSC_PSC_Field is STM32_SVD.UInt16;
-- prescaler
type PSC_Register is record
-- Prescaler value
PSC : PSC_PSC_Field := 16#0#;
-- unspecified
Reserved_16_31 : STM32_SVD.UInt16 := 16#0#;
end record
with Volatile_Full_Access, Size => 32,
Bit_Order => System.Low_Order_First;
for PSC_Register use record
PSC at 0 range 0 .. 15;
Reserved_16_31 at 0 range 16 .. 31;
end record;
subtype ARR_ARR_Field is STM32_SVD.UInt16;
-- auto-reload register
type ARR_Register is record
-- Auto-reload value
ARR : ARR_ARR_Field := 16#0#;
-- unspecified
Reserved_16_31 : STM32_SVD.UInt16 := 16#0#;
end record
with Volatile_Full_Access, Size => 32,
Bit_Order => System.Low_Order_First;
for ARR_Register use record
ARR at 0 range 0 .. 15;
Reserved_16_31 at 0 range 16 .. 31;
end record;
subtype RCR_REP_Field is STM32_SVD.Byte;
-- repetition counter register
type RCR_Register is record
-- Repetition counter value
REP : RCR_REP_Field := 16#0#;
-- unspecified
Reserved_8_31 : STM32_SVD.UInt24 := 16#0#;
end record
with Volatile_Full_Access, Size => 32,
Bit_Order => System.Low_Order_First;
for RCR_Register use record
REP at 0 range 0 .. 7;
Reserved_8_31 at 0 range 8 .. 31;
end record;
subtype CCR1_CCR1_Field is STM32_SVD.UInt16;
-- capture/compare register 1
type CCR1_Register is record
-- Capture/Compare 1 value
CCR1 : CCR1_CCR1_Field := 16#0#;
-- unspecified
Reserved_16_31 : STM32_SVD.UInt16 := 16#0#;
end record
with Volatile_Full_Access, Size => 32,
Bit_Order => System.Low_Order_First;
for CCR1_Register use record
CCR1 at 0 range 0 .. 15;
Reserved_16_31 at 0 range 16 .. 31;
end record;
subtype CCR2_CCR2_Field is STM32_SVD.UInt16;
-- capture/compare register 2
type CCR2_Register is record
-- Capture/Compare 2 value
CCR2 : CCR2_CCR2_Field := 16#0#;
-- unspecified
Reserved_16_31 : STM32_SVD.UInt16 := 16#0#;
end record
with Volatile_Full_Access, Size => 32,
Bit_Order => System.Low_Order_First;
for CCR2_Register use record
CCR2 at 0 range 0 .. 15;
Reserved_16_31 at 0 range 16 .. 31;
end record;
subtype CCR3_CCR3_Field is STM32_SVD.UInt16;
-- capture/compare register 3
type CCR3_Register is record
-- Capture/Compare value
CCR3 : CCR3_CCR3_Field := 16#0#;
-- unspecified
Reserved_16_31 : STM32_SVD.UInt16 := 16#0#;
end record
with Volatile_Full_Access, Size => 32,
Bit_Order => System.Low_Order_First;
for CCR3_Register use record
CCR3 at 0 range 0 .. 15;
Reserved_16_31 at 0 range 16 .. 31;
end record;
subtype CCR4_CCR4_Field is STM32_SVD.UInt16;
-- capture/compare register 4
type CCR4_Register is record
-- Capture/Compare value
CCR4 : CCR4_CCR4_Field := 16#0#;
-- unspecified
Reserved_16_31 : STM32_SVD.UInt16 := 16#0#;
end record
with Volatile_Full_Access, Size => 32,
Bit_Order => System.Low_Order_First;
for CCR4_Register use record
CCR4 at 0 range 0 .. 15;
Reserved_16_31 at 0 range 16 .. 31;
end record;
subtype BDTR_DTG_Field is STM32_SVD.Byte;
subtype BDTR_LOCK_Field is STM32_SVD.UInt2;
subtype BDTR_OSSI_Field is STM32_SVD.Bit;
subtype BDTR_OSSR_Field is STM32_SVD.Bit;
subtype BDTR_BKE_Field is STM32_SVD.Bit;
subtype BDTR_BKP_Field is STM32_SVD.Bit;
subtype BDTR_AOE_Field is STM32_SVD.Bit;
subtype BDTR_MOE_Field is STM32_SVD.Bit;
-- break and dead-time register
type BDTR_Register is record
-- Dead-time generator setup
DTG : BDTR_DTG_Field := 16#0#;
-- Lock configuration
LOCK : BDTR_LOCK_Field := 16#0#;
-- Off-state selection for Idle mode
OSSI : BDTR_OSSI_Field := 16#0#;
-- Off-state selection for Run mode
OSSR : BDTR_OSSR_Field := 16#0#;
-- Break enable
BKE : BDTR_BKE_Field := 16#0#;
-- Break polarity
BKP : BDTR_BKP_Field := 16#0#;
-- Automatic output enable
AOE : BDTR_AOE_Field := 16#0#;
-- Main output enable
MOE : BDTR_MOE_Field := 16#0#;
-- unspecified
Reserved_16_31 : STM32_SVD.UInt16 := 16#0#;
end record
with Volatile_Full_Access, Size => 32,
Bit_Order => System.Low_Order_First;
for BDTR_Register use record
DTG at 0 range 0 .. 7;
LOCK at 0 range 8 .. 9;
OSSI at 0 range 10 .. 10;
OSSR at 0 range 11 .. 11;
BKE at 0 range 12 .. 12;
BKP at 0 range 13 .. 13;
AOE at 0 range 14 .. 14;
MOE at 0 range 15 .. 15;
Reserved_16_31 at 0 range 16 .. 31;
end record;
subtype DCR_DBA_Field is STM32_SVD.UInt5;
subtype DCR_DBL_Field is STM32_SVD.UInt5;
-- DMA control register
type DCR_Register is record
-- DMA base address
DBA : DCR_DBA_Field := 16#0#;
-- unspecified
Reserved_5_7 : STM32_SVD.UInt3 := 16#0#;
-- DMA burst length
DBL : DCR_DBL_Field := 16#0#;
-- unspecified
Reserved_13_31 : STM32_SVD.UInt19 := 16#0#;
end record
with Volatile_Full_Access, Size => 32,
Bit_Order => System.Low_Order_First;
for DCR_Register use record
DBA at 0 range 0 .. 4;
Reserved_5_7 at 0 range 5 .. 7;
DBL at 0 range 8 .. 12;
Reserved_13_31 at 0 range 13 .. 31;
end record;
subtype DMAR_DMAB_Field is STM32_SVD.UInt16;
-- DMA address for full transfer
type DMAR_Register is record
-- DMA register for burst accesses
DMAB : DMAR_DMAB_Field := 16#0#;
-- unspecified
Reserved_16_31 : STM32_SVD.UInt16 := 16#0#;
end record
with Volatile_Full_Access, Size => 32,
Bit_Order => System.Low_Order_First;
for DMAR_Register use record
DMAB at 0 range 0 .. 15;
Reserved_16_31 at 0 range 16 .. 31;
end record;
-- control register 2
type CR2_Register_1 is record
-- unspecified
Reserved_0_2 : STM32_SVD.UInt3 := 16#0#;
-- Capture/compare DMA selection
CCDS : CR2_CCDS_Field := 16#0#;
-- Master mode selection
MMS : CR2_MMS_Field := 16#0#;
-- TI1 selection
TI1S : CR2_TI1S_Field := 16#0#;
-- unspecified
Reserved_8_31 : STM32_SVD.UInt24 := 16#0#;
end record
with Volatile_Full_Access, Size => 32,
Bit_Order => System.Low_Order_First;
for CR2_Register_1 use record
Reserved_0_2 at 0 range 0 .. 2;
CCDS at 0 range 3 .. 3;
MMS at 0 range 4 .. 6;
TI1S at 0 range 7 .. 7;
Reserved_8_31 at 0 range 8 .. 31;
end record;
-- DMA/Interrupt enable register
type DIER_Register_1 is record
-- Update interrupt enable
UIE : DIER_UIE_Field := 16#0#;
-- Capture/Compare 1 interrupt enable
CC1IE : DIER_CC1IE_Field := 16#0#;
-- Capture/Compare 2 interrupt enable
CC2IE : DIER_CC2IE_Field := 16#0#;
-- Capture/Compare 3 interrupt enable
CC3IE : DIER_CC3IE_Field := 16#0#;
-- Capture/Compare 4 interrupt enable
CC4IE : DIER_CC4IE_Field := 16#0#;
-- unspecified
Reserved_5_5 : STM32_SVD.Bit := 16#0#;
-- Trigger interrupt enable
TIE : DIER_TIE_Field := 16#0#;
-- unspecified
Reserved_7_7 : STM32_SVD.Bit := 16#0#;
-- Update DMA request enable
UDE : DIER_UDE_Field := 16#0#;
-- Capture/Compare 1 DMA request enable
CC1DE : DIER_CC1DE_Field := 16#0#;
-- Capture/Compare 2 DMA request enable
CC2DE : DIER_CC2DE_Field := 16#0#;
-- Capture/Compare 3 DMA request enable
CC3DE : DIER_CC3DE_Field := 16#0#;
-- Capture/Compare 4 DMA request enable
CC4DE : DIER_CC4DE_Field := 16#0#;
-- unspecified
Reserved_13_13 : STM32_SVD.Bit := 16#0#;
-- Trigger DMA request enable
TDE : DIER_TDE_Field := 16#0#;
-- unspecified
Reserved_15_31 : STM32_SVD.UInt17 := 16#0#;
end record
with Volatile_Full_Access, Size => 32,
Bit_Order => System.Low_Order_First;
for DIER_Register_1 use record
UIE at 0 range 0 .. 0;
CC1IE at 0 range 1 .. 1;
CC2IE at 0 range 2 .. 2;
CC3IE at 0 range 3 .. 3;
CC4IE at 0 range 4 .. 4;
Reserved_5_5 at 0 range 5 .. 5;
TIE at 0 range 6 .. 6;
Reserved_7_7 at 0 range 7 .. 7;
UDE at 0 range 8 .. 8;
CC1DE at 0 range 9 .. 9;
CC2DE at 0 range 10 .. 10;
CC3DE at 0 range 11 .. 11;
CC4DE at 0 range 12 .. 12;
Reserved_13_13 at 0 range 13 .. 13;
TDE at 0 range 14 .. 14;
Reserved_15_31 at 0 range 15 .. 31;
end record;
-- status register
type SR_Register_1 is record
-- Update interrupt flag
UIF : SR_UIF_Field := 16#0#;
-- Capture/compare 1 interrupt flag
CC1IF : SR_CC1IF_Field := 16#0#;
-- Capture/Compare 2 interrupt flag
CC2IF : SR_CC2IF_Field := 16#0#;
-- Capture/Compare 3 interrupt flag
CC3IF : SR_CC3IF_Field := 16#0#;
-- Capture/Compare 4 interrupt flag
CC4IF : SR_CC4IF_Field := 16#0#;
-- unspecified
Reserved_5_5 : STM32_SVD.Bit := 16#0#;
-- Trigger interrupt flag
TIF : SR_TIF_Field := 16#0#;
-- unspecified
Reserved_7_8 : STM32_SVD.UInt2 := 16#0#;
-- Capture/Compare 1 overcapture flag
CC1OF : SR_CC1OF_Field := 16#0#;
-- Capture/compare 2 overcapture flag
CC2OF : SR_CC2OF_Field := 16#0#;
-- Capture/Compare 3 overcapture flag
CC3OF : SR_CC3OF_Field := 16#0#;
-- Capture/Compare 4 overcapture flag
CC4OF : SR_CC4OF_Field := 16#0#;
-- unspecified
Reserved_13_31 : STM32_SVD.UInt19 := 16#0#;
end record
with Volatile_Full_Access, Size => 32,
Bit_Order => System.Low_Order_First;
for SR_Register_1 use record
UIF at 0 range 0 .. 0;
CC1IF at 0 range 1 .. 1;
CC2IF at 0 range 2 .. 2;
CC3IF at 0 range 3 .. 3;
CC4IF at 0 range 4 .. 4;
Reserved_5_5 at 0 range 5 .. 5;
TIF at 0 range 6 .. 6;
Reserved_7_8 at 0 range 7 .. 8;
CC1OF at 0 range 9 .. 9;
CC2OF at 0 range 10 .. 10;
CC3OF at 0 range 11 .. 11;
CC4OF at 0 range 12 .. 12;
Reserved_13_31 at 0 range 13 .. 31;
end record;
-- event generation register
type EGR_Register_1 is record
-- Write-only. Update generation
UG : EGR_UG_Field := 16#0#;
-- Write-only. Capture/compare 1 generation
CC1G : EGR_CC1G_Field := 16#0#;
-- Write-only. Capture/compare 2 generation
CC2G : EGR_CC2G_Field := 16#0#;
-- Write-only. Capture/compare 3 generation
CC3G : EGR_CC3G_Field := 16#0#;
-- Write-only. Capture/compare 4 generation
CC4G : EGR_CC4G_Field := 16#0#;
-- unspecified
Reserved_5_5 : STM32_SVD.Bit := 16#0#;
-- Write-only. Trigger generation
TG : EGR_TG_Field := 16#0#;
-- unspecified
Reserved_7_31 : STM32_SVD.UInt25 := 16#0#;
end record
with Volatile_Full_Access, Size => 32,
Bit_Order => System.Low_Order_First;
for EGR_Register_1 use record
UG at 0 range 0 .. 0;
CC1G at 0 range 1 .. 1;
CC2G at 0 range 2 .. 2;
CC3G at 0 range 3 .. 3;
CC4G at 0 range 4 .. 4;
Reserved_5_5 at 0 range 5 .. 5;
TG at 0 range 6 .. 6;
Reserved_7_31 at 0 range 7 .. 31;
end record;
subtype CCMR2_Output_O24CE_Field is STM32_SVD.Bit;
-- capture/compare mode register 2 (output mode)
type CCMR2_Output_Register_1 is record
-- CC3S
CC3S : CCMR2_Output_CC3S_Field := 16#0#;
-- OC3FE
OC3FE : CCMR2_Output_OC3FE_Field := 16#0#;
-- OC3PE
OC3PE : CCMR2_Output_OC3PE_Field := 16#0#;
-- OC3M
OC3M : CCMR2_Output_OC3M_Field := 16#0#;
-- OC3CE
OC3CE : CCMR2_Output_OC3CE_Field := 16#0#;
-- CC4S
CC4S : CCMR2_Output_CC4S_Field := 16#0#;
-- OC4FE
OC4FE : CCMR2_Output_OC4FE_Field := 16#0#;
-- OC4PE
OC4PE : CCMR2_Output_OC4PE_Field := 16#0#;
-- OC4M
OC4M : CCMR2_Output_OC4M_Field := 16#0#;
-- O24CE
O24CE : CCMR2_Output_O24CE_Field := 16#0#;
-- unspecified
Reserved_16_31 : STM32_SVD.UInt16 := 16#0#;
end record
with Volatile_Full_Access, Size => 32,
Bit_Order => System.Low_Order_First;
for CCMR2_Output_Register_1 use record
CC3S at 0 range 0 .. 1;
OC3FE at 0 range 2 .. 2;
OC3PE at 0 range 3 .. 3;
OC3M at 0 range 4 .. 6;
OC3CE at 0 range 7 .. 7;
CC4S at 0 range 8 .. 9;
OC4FE at 0 range 10 .. 10;
OC4PE at 0 range 11 .. 11;
OC4M at 0 range 12 .. 14;
O24CE at 0 range 15 .. 15;
Reserved_16_31 at 0 range 16 .. 31;
end record;
subtype CCER_CC4NP_Field is STM32_SVD.Bit;
-- capture/compare enable register
type CCER_Register_1 is record
-- Capture/Compare 1 output enable
CC1E : CCER_CC1E_Field := 16#0#;
-- Capture/Compare 1 output Polarity
CC1P : CCER_CC1P_Field := 16#0#;
-- unspecified
Reserved_2_2 : STM32_SVD.Bit := 16#0#;
-- Capture/Compare 1 output Polarity
CC1NP : CCER_CC1NP_Field := 16#0#;
-- Capture/Compare 2 output enable
CC2E : CCER_CC2E_Field := 16#0#;
-- Capture/Compare 2 output Polarity
CC2P : CCER_CC2P_Field := 16#0#;
-- unspecified
Reserved_6_6 : STM32_SVD.Bit := 16#0#;
-- Capture/Compare 2 output Polarity
CC2NP : CCER_CC2NP_Field := 16#0#;
-- Capture/Compare 3 output enable
CC3E : CCER_CC3E_Field := 16#0#;
-- Capture/Compare 3 output Polarity
CC3P : CCER_CC3P_Field := 16#0#;
-- unspecified
Reserved_10_10 : STM32_SVD.Bit := 16#0#;
-- Capture/Compare 3 output Polarity
CC3NP : CCER_CC3NP_Field := 16#0#;
-- Capture/Compare 4 output enable
CC4E : CCER_CC4E_Field := 16#0#;
-- Capture/Compare 3 output Polarity
CC4P : CCER_CC4P_Field := 16#0#;
-- unspecified
Reserved_14_14 : STM32_SVD.Bit := 16#0#;
-- Capture/Compare 4 output Polarity
CC4NP : CCER_CC4NP_Field := 16#0#;
-- unspecified
Reserved_16_31 : STM32_SVD.UInt16 := 16#0#;
end record
with Volatile_Full_Access, Size => 32,
Bit_Order => System.Low_Order_First;
for CCER_Register_1 use record
CC1E at 0 range 0 .. 0;
CC1P at 0 range 1 .. 1;
Reserved_2_2 at 0 range 2 .. 2;
CC1NP at 0 range 3 .. 3;
CC2E at 0 range 4 .. 4;
CC2P at 0 range 5 .. 5;
Reserved_6_6 at 0 range 6 .. 6;
CC2NP at 0 range 7 .. 7;
CC3E at 0 range 8 .. 8;
CC3P at 0 range 9 .. 9;
Reserved_10_10 at 0 range 10 .. 10;
CC3NP at 0 range 11 .. 11;
CC4E at 0 range 12 .. 12;
CC4P at 0 range 13 .. 13;
Reserved_14_14 at 0 range 14 .. 14;
CC4NP at 0 range 15 .. 15;
Reserved_16_31 at 0 range 16 .. 31;
end record;
subtype CNT_CNT_L_Field is STM32_SVD.UInt16;
subtype CNT_CNT_H_Field is STM32_SVD.UInt16;
-- counter
type CNT_Register_1 is record
-- Low counter value
CNT_L : CNT_CNT_L_Field := 16#0#;
-- High counter value
CNT_H : CNT_CNT_H_Field := 16#0#;
end record
with Volatile_Full_Access, Size => 32,
Bit_Order => System.Low_Order_First;
for CNT_Register_1 use record
CNT_L at 0 range 0 .. 15;
CNT_H at 0 range 16 .. 31;
end record;
subtype ARR_ARR_L_Field is STM32_SVD.UInt16;
subtype ARR_ARR_H_Field is STM32_SVD.UInt16;
-- auto-reload register
type ARR_Register_1 is record
-- Low Auto-reload value
ARR_L : ARR_ARR_L_Field := 16#0#;
-- High Auto-reload value
ARR_H : ARR_ARR_H_Field := 16#0#;
end record
with Volatile_Full_Access, Size => 32,
Bit_Order => System.Low_Order_First;
for ARR_Register_1 use record
ARR_L at 0 range 0 .. 15;
ARR_H at 0 range 16 .. 31;
end record;
subtype CCR1_CCR1_L_Field is STM32_SVD.UInt16;
subtype CCR1_CCR1_H_Field is STM32_SVD.UInt16;
-- capture/compare register 1
type CCR1_Register_1 is record
-- Low Capture/Compare 1 value
CCR1_L : CCR1_CCR1_L_Field := 16#0#;
-- High Capture/Compare 1 value
CCR1_H : CCR1_CCR1_H_Field := 16#0#;
end record
with Volatile_Full_Access, Size => 32,
Bit_Order => System.Low_Order_First;
for CCR1_Register_1 use record
CCR1_L at 0 range 0 .. 15;
CCR1_H at 0 range 16 .. 31;
end record;
subtype CCR2_CCR2_L_Field is STM32_SVD.UInt16;
subtype CCR2_CCR2_H_Field is STM32_SVD.UInt16;
-- capture/compare register 2
type CCR2_Register_1 is record
-- Low Capture/Compare 2 value
CCR2_L : CCR2_CCR2_L_Field := 16#0#;
-- High Capture/Compare 2 value
CCR2_H : CCR2_CCR2_H_Field := 16#0#;
end record
with Volatile_Full_Access, Size => 32,
Bit_Order => System.Low_Order_First;
for CCR2_Register_1 use record
CCR2_L at 0 range 0 .. 15;
CCR2_H at 0 range 16 .. 31;
end record;
subtype CCR3_CCR3_L_Field is STM32_SVD.UInt16;
subtype CCR3_CCR3_H_Field is STM32_SVD.UInt16;
-- capture/compare register 3
type CCR3_Register_1 is record
-- Low Capture/Compare value
CCR3_L : CCR3_CCR3_L_Field := 16#0#;
-- High Capture/Compare value
CCR3_H : CCR3_CCR3_H_Field := 16#0#;
end record
with Volatile_Full_Access, Size => 32,
Bit_Order => System.Low_Order_First;
for CCR3_Register_1 use record
CCR3_L at 0 range 0 .. 15;
CCR3_H at 0 range 16 .. 31;
end record;
subtype CCR4_CCR4_L_Field is STM32_SVD.UInt16;
subtype CCR4_CCR4_H_Field is STM32_SVD.UInt16;
-- capture/compare register 4
type CCR4_Register_1 is record
-- Low Capture/Compare value
CCR4_L : CCR4_CCR4_L_Field := 16#0#;
-- High Capture/Compare value
CCR4_H : CCR4_CCR4_H_Field := 16#0#;
end record
with Volatile_Full_Access, Size => 32,
Bit_Order => System.Low_Order_First;
for CCR4_Register_1 use record
CCR4_L at 0 range 0 .. 15;
CCR4_H at 0 range 16 .. 31;
end record;
subtype OR_ITR1_RMP_Field is STM32_SVD.UInt2;
-- TIM5 option register
type OR_Register is record
-- unspecified
Reserved_0_9 : STM32_SVD.UInt10 := 16#0#;
-- Timer Input 4 remap
ITR1_RMP : OR_ITR1_RMP_Field := 16#0#;
-- unspecified
Reserved_12_31 : STM32_SVD.UInt20 := 16#0#;
end record
with Volatile_Full_Access, Size => 32,
Bit_Order => System.Low_Order_First;
for OR_Register use record
Reserved_0_9 at 0 range 0 .. 9;
ITR1_RMP at 0 range 10 .. 11;
Reserved_12_31 at 0 range 12 .. 31;
end record;
subtype OR_IT4_RMP_Field is STM32_SVD.UInt2;
-- TIM5 option register
type OR_Register_1 is record
-- unspecified
Reserved_0_5 : STM32_SVD.UInt6 := 16#0#;
-- Timer Input 4 remap
IT4_RMP : OR_IT4_RMP_Field := 16#0#;
-- unspecified
Reserved_8_31 : STM32_SVD.UInt24 := 16#0#;
end record
with Volatile_Full_Access, Size => 32,
Bit_Order => System.Low_Order_First;
for OR_Register_1 use record
Reserved_0_5 at 0 range 0 .. 5;
IT4_RMP at 0 range 6 .. 7;
Reserved_8_31 at 0 range 8 .. 31;
end record;
-- control register 1
type CR1_Register_1 is record
-- Counter enable
CEN : CR1_CEN_Field := 16#0#;
-- Update disable
UDIS : CR1_UDIS_Field := 16#0#;
-- Update request source
URS : CR1_URS_Field := 16#0#;
-- One-pulse mode
OPM : CR1_OPM_Field := 16#0#;
-- unspecified
Reserved_4_6 : STM32_SVD.UInt3 := 16#0#;
-- Auto-reload preload enable
ARPE : CR1_ARPE_Field := 16#0#;
-- Clock division
CKD : CR1_CKD_Field := 16#0#;
-- unspecified
Reserved_10_31 : STM32_SVD.UInt22 := 16#0#;
end record
with Volatile_Full_Access, Size => 32,
Bit_Order => System.Low_Order_First;
for CR1_Register_1 use record
CEN at 0 range 0 .. 0;
UDIS at 0 range 1 .. 1;
URS at 0 range 2 .. 2;
OPM at 0 range 3 .. 3;
Reserved_4_6 at 0 range 4 .. 6;
ARPE at 0 range 7 .. 7;
CKD at 0 range 8 .. 9;
Reserved_10_31 at 0 range 10 .. 31;
end record;
-- control register 2
type CR2_Register_2 is record
-- unspecified
Reserved_0_3 : STM32_SVD.UInt4 := 16#0#;
-- Master mode selection
MMS : CR2_MMS_Field := 16#0#;
-- unspecified
Reserved_7_31 : STM32_SVD.UInt25 := 16#0#;
end record
with Volatile_Full_Access, Size => 32,
Bit_Order => System.Low_Order_First;
for CR2_Register_2 use record
Reserved_0_3 at 0 range 0 .. 3;
MMS at 0 range 4 .. 6;
Reserved_7_31 at 0 range 7 .. 31;
end record;
-- slave mode control register
type SMCR_Register_1 is record
-- Slave mode selection
SMS : SMCR_SMS_Field := 16#0#;
-- unspecified
Reserved_3_3 : STM32_SVD.Bit := 16#0#;
-- Trigger selection
TS : SMCR_TS_Field := 16#0#;
-- Master/Slave mode
MSM : SMCR_MSM_Field := 16#0#;
-- unspecified
Reserved_8_31 : STM32_SVD.UInt24 := 16#0#;
end record
with Volatile_Full_Access, Size => 32,
Bit_Order => System.Low_Order_First;
for SMCR_Register_1 use record
SMS at 0 range 0 .. 2;
Reserved_3_3 at 0 range 3 .. 3;
TS at 0 range 4 .. 6;
MSM at 0 range 7 .. 7;
Reserved_8_31 at 0 range 8 .. 31;
end record;
-- DMA/Interrupt enable register
type DIER_Register_2 is record
-- Update interrupt enable
UIE : DIER_UIE_Field := 16#0#;
-- Capture/Compare 1 interrupt enable
CC1IE : DIER_CC1IE_Field := 16#0#;
-- Capture/Compare 2 interrupt enable
CC2IE : DIER_CC2IE_Field := 16#0#;
-- unspecified
Reserved_3_5 : STM32_SVD.UInt3 := 16#0#;
-- Trigger interrupt enable
TIE : DIER_TIE_Field := 16#0#;
-- unspecified
Reserved_7_31 : STM32_SVD.UInt25 := 16#0#;
end record
with Volatile_Full_Access, Size => 32,
Bit_Order => System.Low_Order_First;
for DIER_Register_2 use record
UIE at 0 range 0 .. 0;
CC1IE at 0 range 1 .. 1;
CC2IE at 0 range 2 .. 2;
Reserved_3_5 at 0 range 3 .. 5;
TIE at 0 range 6 .. 6;
Reserved_7_31 at 0 range 7 .. 31;
end record;
-- status register
type SR_Register_2 is record
-- Update interrupt flag
UIF : SR_UIF_Field := 16#0#;
-- Capture/compare 1 interrupt flag
CC1IF : SR_CC1IF_Field := 16#0#;
-- Capture/Compare 2 interrupt flag
CC2IF : SR_CC2IF_Field := 16#0#;
-- unspecified
Reserved_3_5 : STM32_SVD.UInt3 := 16#0#;
-- Trigger interrupt flag
TIF : SR_TIF_Field := 16#0#;
-- unspecified
Reserved_7_8 : STM32_SVD.UInt2 := 16#0#;
-- Capture/Compare 1 overcapture flag
CC1OF : SR_CC1OF_Field := 16#0#;
-- Capture/compare 2 overcapture flag
CC2OF : SR_CC2OF_Field := 16#0#;
-- unspecified
Reserved_11_31 : STM32_SVD.UInt21 := 16#0#;
end record
with Volatile_Full_Access, Size => 32,
Bit_Order => System.Low_Order_First;
for SR_Register_2 use record
UIF at 0 range 0 .. 0;
CC1IF at 0 range 1 .. 1;
CC2IF at 0 range 2 .. 2;
Reserved_3_5 at 0 range 3 .. 5;
TIF at 0 range 6 .. 6;
Reserved_7_8 at 0 range 7 .. 8;
CC1OF at 0 range 9 .. 9;
CC2OF at 0 range 10 .. 10;
Reserved_11_31 at 0 range 11 .. 31;
end record;
-- event generation register
type EGR_Register_2 is record
-- Write-only. Update generation
UG : EGR_UG_Field := 16#0#;
-- Write-only. Capture/compare 1 generation
CC1G : EGR_CC1G_Field := 16#0#;
-- Write-only. Capture/compare 2 generation
CC2G : EGR_CC2G_Field := 16#0#;
-- unspecified
Reserved_3_5 : STM32_SVD.UInt3 := 16#0#;
-- Write-only. Trigger generation
TG : EGR_TG_Field := 16#0#;
-- unspecified
Reserved_7_31 : STM32_SVD.UInt25 := 16#0#;
end record
with Volatile_Full_Access, Size => 32,
Bit_Order => System.Low_Order_First;
for EGR_Register_2 use record
UG at 0 range 0 .. 0;
CC1G at 0 range 1 .. 1;
CC2G at 0 range 2 .. 2;
Reserved_3_5 at 0 range 3 .. 5;
TG at 0 range 6 .. 6;
Reserved_7_31 at 0 range 7 .. 31;
end record;
-- capture/compare mode register 1 (output mode)
type CCMR1_Output_Register_1 is record
-- Capture/Compare 1 selection
CC1S : CCMR1_Output_CC1S_Field := 16#0#;
-- Output Compare 1 fast enable
OC1FE : CCMR1_Output_OC1FE_Field := 16#0#;
-- Output Compare 1 preload enable
OC1PE : CCMR1_Output_OC1PE_Field := 16#0#;
-- Output Compare 1 mode
OC1M : CCMR1_Output_OC1M_Field := 16#0#;
-- unspecified
Reserved_7_7 : STM32_SVD.Bit := 16#0#;
-- Capture/Compare 2 selection
CC2S : CCMR1_Output_CC2S_Field := 16#0#;
-- Output Compare 2 fast enable
OC2FE : CCMR1_Output_OC2FE_Field := 16#0#;
-- Output Compare 2 preload enable
OC2PE : CCMR1_Output_OC2PE_Field := 16#0#;
-- Output Compare 2 mode
OC2M : CCMR1_Output_OC2M_Field := 16#0#;
-- unspecified
Reserved_15_31 : STM32_SVD.UInt17 := 16#0#;
end record
with Volatile_Full_Access, Size => 32,
Bit_Order => System.Low_Order_First;
for CCMR1_Output_Register_1 use record
CC1S at 0 range 0 .. 1;
OC1FE at 0 range 2 .. 2;
OC1PE at 0 range 3 .. 3;
OC1M at 0 range 4 .. 6;
Reserved_7_7 at 0 range 7 .. 7;
CC2S at 0 range 8 .. 9;
OC2FE at 0 range 10 .. 10;
OC2PE at 0 range 11 .. 11;
OC2M at 0 range 12 .. 14;
Reserved_15_31 at 0 range 15 .. 31;
end record;
subtype CCMR1_Input_IC1F_Field_1 is STM32_SVD.UInt3;
subtype CCMR1_Input_IC2F_Field_1 is STM32_SVD.UInt3;
-- capture/compare mode register 1 (input mode)
type CCMR1_Input_Register_1 is record
-- Capture/Compare 1 selection
CC1S : CCMR1_Input_CC1S_Field := 16#0#;
-- Input capture 1 prescaler
ICPCS : CCMR1_Input_ICPCS_Field := 16#0#;
-- Input capture 1 filter
IC1F : CCMR1_Input_IC1F_Field_1 := 16#0#;
-- unspecified
Reserved_7_7 : STM32_SVD.Bit := 16#0#;
-- Capture/Compare 2 selection
CC2S : CCMR1_Input_CC2S_Field := 16#0#;
-- Input capture 2 prescaler
IC2PCS : CCMR1_Input_IC2PCS_Field := 16#0#;
-- Input capture 2 filter
IC2F : CCMR1_Input_IC2F_Field_1 := 16#0#;
-- unspecified
Reserved_15_31 : STM32_SVD.UInt17 := 16#0#;
end record
with Volatile_Full_Access, Size => 32,
Bit_Order => System.Low_Order_First;
for CCMR1_Input_Register_1 use record
CC1S at 0 range 0 .. 1;
ICPCS at 0 range 2 .. 3;
IC1F at 0 range 4 .. 6;
Reserved_7_7 at 0 range 7 .. 7;
CC2S at 0 range 8 .. 9;
IC2PCS at 0 range 10 .. 11;
IC2F at 0 range 12 .. 14;
Reserved_15_31 at 0 range 15 .. 31;
end record;
-- capture/compare enable register
type CCER_Register_2 is record
-- Capture/Compare 1 output enable
CC1E : CCER_CC1E_Field := 16#0#;
-- Capture/Compare 1 output Polarity
CC1P : CCER_CC1P_Field := 16#0#;
-- unspecified
Reserved_2_2 : STM32_SVD.Bit := 16#0#;
-- Capture/Compare 1 output Polarity
CC1NP : CCER_CC1NP_Field := 16#0#;
-- Capture/Compare 2 output enable
CC2E : CCER_CC2E_Field := 16#0#;
-- Capture/Compare 2 output Polarity
CC2P : CCER_CC2P_Field := 16#0#;
-- unspecified
Reserved_6_6 : STM32_SVD.Bit := 16#0#;
-- Capture/Compare 2 output Polarity
CC2NP : CCER_CC2NP_Field := 16#0#;
-- unspecified
Reserved_8_31 : STM32_SVD.UInt24 := 16#0#;
end record
with Volatile_Full_Access, Size => 32,
Bit_Order => System.Low_Order_First;
for CCER_Register_2 use record
CC1E at 0 range 0 .. 0;
CC1P at 0 range 1 .. 1;
Reserved_2_2 at 0 range 2 .. 2;
CC1NP at 0 range 3 .. 3;
CC2E at 0 range 4 .. 4;
CC2P at 0 range 5 .. 5;
Reserved_6_6 at 0 range 6 .. 6;
CC2NP at 0 range 7 .. 7;
Reserved_8_31 at 0 range 8 .. 31;
end record;
-- control register 1
type CR1_Register_2 is record
-- Counter enable
CEN : CR1_CEN_Field := 16#0#;
-- Update disable
UDIS : CR1_UDIS_Field := 16#0#;
-- Update request source
URS : CR1_URS_Field := 16#0#;
-- unspecified
Reserved_3_6 : STM32_SVD.UInt4 := 16#0#;
-- Auto-reload preload enable
ARPE : CR1_ARPE_Field := 16#0#;
-- Clock division
CKD : CR1_CKD_Field := 16#0#;
-- unspecified
Reserved_10_31 : STM32_SVD.UInt22 := 16#0#;
end record
with Volatile_Full_Access, Size => 32,
Bit_Order => System.Low_Order_First;
for CR1_Register_2 use record
CEN at 0 range 0 .. 0;
UDIS at 0 range 1 .. 1;
URS at 0 range 2 .. 2;
Reserved_3_6 at 0 range 3 .. 6;
ARPE at 0 range 7 .. 7;
CKD at 0 range 8 .. 9;
Reserved_10_31 at 0 range 10 .. 31;
end record;
-- DMA/Interrupt enable register
type DIER_Register_3 is record
-- Update interrupt enable
UIE : DIER_UIE_Field := 16#0#;
-- Capture/Compare 1 interrupt enable
CC1IE : DIER_CC1IE_Field := 16#0#;
-- unspecified
Reserved_2_31 : STM32_SVD.UInt30 := 16#0#;
end record
with Volatile_Full_Access, Size => 32,
Bit_Order => System.Low_Order_First;
for DIER_Register_3 use record
UIE at 0 range 0 .. 0;
CC1IE at 0 range 1 .. 1;
Reserved_2_31 at 0 range 2 .. 31;
end record;
-- status register
type SR_Register_3 is record
-- Update interrupt flag
UIF : SR_UIF_Field := 16#0#;
-- Capture/compare 1 interrupt flag
CC1IF : SR_CC1IF_Field := 16#0#;
-- unspecified
Reserved_2_8 : STM32_SVD.UInt7 := 16#0#;
-- Capture/Compare 1 overcapture flag
CC1OF : SR_CC1OF_Field := 16#0#;
-- unspecified
Reserved_10_31 : STM32_SVD.UInt22 := 16#0#;
end record
with Volatile_Full_Access, Size => 32,
Bit_Order => System.Low_Order_First;
for SR_Register_3 use record
UIF at 0 range 0 .. 0;
CC1IF at 0 range 1 .. 1;
Reserved_2_8 at 0 range 2 .. 8;
CC1OF at 0 range 9 .. 9;
Reserved_10_31 at 0 range 10 .. 31;
end record;
-- event generation register
type EGR_Register_3 is record
-- Write-only. Update generation
UG : EGR_UG_Field := 16#0#;
-- Write-only. Capture/compare 1 generation
CC1G : EGR_CC1G_Field := 16#0#;
-- unspecified
Reserved_2_31 : STM32_SVD.UInt30 := 16#0#;
end record
with Volatile_Full_Access, Size => 32,
Bit_Order => System.Low_Order_First;
for EGR_Register_3 use record
UG at 0 range 0 .. 0;
CC1G at 0 range 1 .. 1;
Reserved_2_31 at 0 range 2 .. 31;
end record;
-- capture/compare mode register 1 (output mode)
type CCMR1_Output_Register_2 is record
-- Capture/Compare 1 selection
CC1S : CCMR1_Output_CC1S_Field := 16#0#;
-- Output Compare 1 fast enable
OC1FE : CCMR1_Output_OC1FE_Field := 16#0#;
-- Output Compare 1 preload enable
OC1PE : CCMR1_Output_OC1PE_Field := 16#0#;
-- Output Compare 1 mode
OC1M : CCMR1_Output_OC1M_Field := 16#0#;
-- unspecified
Reserved_7_31 : STM32_SVD.UInt25 := 16#0#;
end record
with Volatile_Full_Access, Size => 32,
Bit_Order => System.Low_Order_First;
for CCMR1_Output_Register_2 use record
CC1S at 0 range 0 .. 1;
OC1FE at 0 range 2 .. 2;
OC1PE at 0 range 3 .. 3;
OC1M at 0 range 4 .. 6;
Reserved_7_31 at 0 range 7 .. 31;
end record;
-- capture/compare mode register 1 (input mode)
type CCMR1_Input_Register_2 is record
-- Capture/Compare 1 selection
CC1S : CCMR1_Input_CC1S_Field := 16#0#;
-- Input capture 1 prescaler
ICPCS : CCMR1_Input_ICPCS_Field := 16#0#;
-- Input capture 1 filter
IC1F : CCMR1_Input_IC1F_Field := 16#0#;
-- unspecified
Reserved_8_31 : STM32_SVD.UInt24 := 16#0#;
end record
with Volatile_Full_Access, Size => 32,
Bit_Order => System.Low_Order_First;
for CCMR1_Input_Register_2 use record
CC1S at 0 range 0 .. 1;
ICPCS at 0 range 2 .. 3;
IC1F at 0 range 4 .. 7;
Reserved_8_31 at 0 range 8 .. 31;
end record;
-- capture/compare enable register
type CCER_Register_3 is record
-- Capture/Compare 1 output enable
CC1E : CCER_CC1E_Field := 16#0#;
-- Capture/Compare 1 output Polarity
CC1P : CCER_CC1P_Field := 16#0#;
-- unspecified
Reserved_2_2 : STM32_SVD.Bit := 16#0#;
-- Capture/Compare 1 output Polarity
CC1NP : CCER_CC1NP_Field := 16#0#;
-- unspecified
Reserved_4_31 : STM32_SVD.UInt28 := 16#0#;
end record
with Volatile_Full_Access, Size => 32,
Bit_Order => System.Low_Order_First;
for CCER_Register_3 use record
CC1E at 0 range 0 .. 0;
CC1P at 0 range 1 .. 1;
Reserved_2_2 at 0 range 2 .. 2;
CC1NP at 0 range 3 .. 3;
Reserved_4_31 at 0 range 4 .. 31;
end record;
subtype OR_RMP_Field is STM32_SVD.UInt2;
-- option register
type OR_Register_2 is record
-- Input 1 remapping capability
RMP : OR_RMP_Field := 16#0#;
-- unspecified
Reserved_2_31 : STM32_SVD.UInt30 := 16#0#;
end record
with Volatile_Full_Access, Size => 32,
Bit_Order => System.Low_Order_First;
for OR_Register_2 use record
RMP at 0 range 0 .. 1;
Reserved_2_31 at 0 range 2 .. 31;
end record;
-----------------
-- Peripherals --
-----------------
type TIM1_Disc is
(
Output,
Input);
-- Advanced-timers
type TIM1_Peripheral
(Discriminent : TIM1_Disc := Output)
is record
-- control register 1
CR1 : aliased CR1_Register;
-- control register 2
CR2 : aliased CR2_Register;
-- slave mode control register
SMCR : aliased SMCR_Register;
-- DMA/Interrupt enable register
DIER : aliased DIER_Register;
-- status register
SR : aliased SR_Register;
-- event generation register
EGR : aliased EGR_Register;
-- capture/compare enable register
CCER : aliased CCER_Register;
-- counter
CNT : aliased CNT_Register;
-- prescaler
PSC : aliased PSC_Register;
-- auto-reload register
ARR : aliased ARR_Register;
-- repetition counter register
RCR : aliased RCR_Register;
-- capture/compare register 1
CCR1 : aliased CCR1_Register;
-- capture/compare register 2
CCR2 : aliased CCR2_Register;
-- capture/compare register 3
CCR3 : aliased CCR3_Register;
-- capture/compare register 4
CCR4 : aliased CCR4_Register;
-- break and dead-time register
BDTR : aliased BDTR_Register;
-- DMA control register
DCR : aliased DCR_Register;
-- DMA address for full transfer
DMAR : aliased DMAR_Register;
case Discriminent is
when Output =>
-- capture/compare mode register 1 (output mode)
CCMR1_Output : aliased CCMR1_Output_Register;
-- capture/compare mode register 2 (output mode)
CCMR2_Output : aliased CCMR2_Output_Register;
when Input =>
-- capture/compare mode register 1 (input mode)
CCMR1_Input : aliased CCMR1_Input_Register;
-- capture/compare mode register 2 (input mode)
CCMR2_Input : aliased CCMR2_Input_Register;
end case;
end record
with Unchecked_Union, Volatile;
for TIM1_Peripheral use record
CR1 at 16#0# range 0 .. 31;
CR2 at 16#4# range 0 .. 31;
SMCR at 16#8# range 0 .. 31;
DIER at 16#C# range 0 .. 31;
SR at 16#10# range 0 .. 31;
EGR at 16#14# range 0 .. 31;
CCER at 16#20# range 0 .. 31;
CNT at 16#24# range 0 .. 31;
PSC at 16#28# range 0 .. 31;
ARR at 16#2C# range 0 .. 31;
RCR at 16#30# range 0 .. 31;
CCR1 at 16#34# range 0 .. 31;
CCR2 at 16#38# range 0 .. 31;
CCR3 at 16#3C# range 0 .. 31;
CCR4 at 16#40# range 0 .. 31;
BDTR at 16#44# range 0 .. 31;
DCR at 16#48# range 0 .. 31;
DMAR at 16#4C# range 0 .. 31;
CCMR1_Output at 16#18# range 0 .. 31;
CCMR2_Output at 16#1C# range 0 .. 31;
CCMR1_Input at 16#18# range 0 .. 31;
CCMR2_Input at 16#1C# range 0 .. 31;
end record;
-- Advanced-timers
TIM1_Periph : aliased TIM1_Peripheral
with Import, Address => System'To_Address (16#40010000#);
-- Advanced-timers
TIM8_Periph : aliased TIM1_Peripheral
with Import, Address => System'To_Address (16#40010400#);
type TIM2_Disc is
(
Output,
Input);
-- General purpose timers
type TIM2_Peripheral
(Discriminent : TIM2_Disc := Output)
is record
-- control register 1
CR1 : aliased CR1_Register;
-- control register 2
CR2 : aliased CR2_Register_1;
-- slave mode control register
SMCR : aliased SMCR_Register;
-- DMA/Interrupt enable register
DIER : aliased DIER_Register_1;
-- status register
SR : aliased SR_Register_1;
-- event generation register
EGR : aliased EGR_Register_1;
-- capture/compare enable register
CCER : aliased CCER_Register_1;
-- counter
CNT : aliased CNT_Register_1;
-- prescaler
PSC : aliased PSC_Register;
-- auto-reload register
ARR : aliased ARR_Register_1;
-- capture/compare register 1
CCR1 : aliased CCR1_Register_1;
-- capture/compare register 2
CCR2 : aliased CCR2_Register_1;
-- capture/compare register 3
CCR3 : aliased CCR3_Register_1;
-- capture/compare register 4
CCR4 : aliased CCR4_Register_1;
-- DMA control register
DCR : aliased DCR_Register;
-- DMA address for full transfer
DMAR : aliased DMAR_Register;
-- TIM5 option register
OR_k : aliased OR_Register;
case Discriminent is
when Output =>
-- capture/compare mode register 1 (output mode)
CCMR1_Output : aliased CCMR1_Output_Register;
-- capture/compare mode register 2 (output mode)
CCMR2_Output : aliased CCMR2_Output_Register_1;
when Input =>
-- capture/compare mode register 1 (input mode)
CCMR1_Input : aliased CCMR1_Input_Register;
-- capture/compare mode register 2 (input mode)
CCMR2_Input : aliased CCMR2_Input_Register;
end case;
end record
with Unchecked_Union, Volatile;
for TIM2_Peripheral use record
CR1 at 16#0# range 0 .. 31;
CR2 at 16#4# range 0 .. 31;
SMCR at 16#8# range 0 .. 31;
DIER at 16#C# range 0 .. 31;
SR at 16#10# range 0 .. 31;
EGR at 16#14# range 0 .. 31;
CCER at 16#20# range 0 .. 31;
CNT at 16#24# range 0 .. 31;
PSC at 16#28# range 0 .. 31;
ARR at 16#2C# range 0 .. 31;
CCR1 at 16#34# range 0 .. 31;
CCR2 at 16#38# range 0 .. 31;
CCR3 at 16#3C# range 0 .. 31;
CCR4 at 16#40# range 0 .. 31;
DCR at 16#48# range 0 .. 31;
DMAR at 16#4C# range 0 .. 31;
OR_k at 16#50# range 0 .. 31;
CCMR1_Output at 16#18# range 0 .. 31;
CCMR2_Output at 16#1C# range 0 .. 31;
CCMR1_Input at 16#18# range 0 .. 31;
CCMR2_Input at 16#1C# range 0 .. 31;
end record;
-- General purpose timers
TIM2_Periph : aliased TIM2_Peripheral
with Import, Address => System'To_Address (16#40000000#);
type TIM3_Disc is
(
Output,
Input);
-- General purpose timers
type TIM3_Peripheral
(Discriminent : TIM3_Disc := Output)
is record
-- control register 1
CR1 : aliased CR1_Register;
-- control register 2
CR2 : aliased CR2_Register_1;
-- slave mode control register
SMCR : aliased SMCR_Register;
-- DMA/Interrupt enable register
DIER : aliased DIER_Register_1;
-- status register
SR : aliased SR_Register_1;
-- event generation register
EGR : aliased EGR_Register_1;
-- capture/compare enable register
CCER : aliased CCER_Register_1;
-- counter
CNT : aliased CNT_Register_1;
-- prescaler
PSC : aliased PSC_Register;
-- auto-reload register
ARR : aliased ARR_Register_1;
-- capture/compare register 1
CCR1 : aliased CCR1_Register_1;
-- capture/compare register 2
CCR2 : aliased CCR2_Register_1;
-- capture/compare register 3
CCR3 : aliased CCR3_Register_1;
-- capture/compare register 4
CCR4 : aliased CCR4_Register_1;
-- DMA control register
DCR : aliased DCR_Register;
-- DMA address for full transfer
DMAR : aliased DMAR_Register;
case Discriminent is
when Output =>
-- capture/compare mode register 1 (output mode)
CCMR1_Output : aliased CCMR1_Output_Register;
-- capture/compare mode register 2 (output mode)
CCMR2_Output : aliased CCMR2_Output_Register_1;
when Input =>
-- capture/compare mode register 1 (input mode)
CCMR1_Input : aliased CCMR1_Input_Register;
-- capture/compare mode register 2 (input mode)
CCMR2_Input : aliased CCMR2_Input_Register;
end case;
end record
with Unchecked_Union, Volatile;
for TIM3_Peripheral use record
CR1 at 16#0# range 0 .. 31;
CR2 at 16#4# range 0 .. 31;
SMCR at 16#8# range 0 .. 31;
DIER at 16#C# range 0 .. 31;
SR at 16#10# range 0 .. 31;
EGR at 16#14# range 0 .. 31;
CCER at 16#20# range 0 .. 31;
CNT at 16#24# range 0 .. 31;
PSC at 16#28# range 0 .. 31;
ARR at 16#2C# range 0 .. 31;
CCR1 at 16#34# range 0 .. 31;
CCR2 at 16#38# range 0 .. 31;
CCR3 at 16#3C# range 0 .. 31;
CCR4 at 16#40# range 0 .. 31;
DCR at 16#48# range 0 .. 31;
DMAR at 16#4C# range 0 .. 31;
CCMR1_Output at 16#18# range 0 .. 31;
CCMR2_Output at 16#1C# range 0 .. 31;
CCMR1_Input at 16#18# range 0 .. 31;
CCMR2_Input at 16#1C# range 0 .. 31;
end record;
-- General purpose timers
TIM3_Periph : aliased TIM3_Peripheral
with Import, Address => System'To_Address (16#40000400#);
-- General purpose timers
TIM4_Periph : aliased TIM3_Peripheral
with Import, Address => System'To_Address (16#40000800#);
type TIM5_Disc is
(
Output,
Input);
-- General-purpose-timers
type TIM5_Peripheral
(Discriminent : TIM5_Disc := Output)
is record
-- control register 1
CR1 : aliased CR1_Register;
-- control register 2
CR2 : aliased CR2_Register_1;
-- slave mode control register
SMCR : aliased SMCR_Register;
-- DMA/Interrupt enable register
DIER : aliased DIER_Register_1;
-- status register
SR : aliased SR_Register_1;
-- event generation register
EGR : aliased EGR_Register_1;
-- capture/compare enable register
CCER : aliased CCER_Register_1;
-- counter
CNT : aliased CNT_Register_1;
-- prescaler
PSC : aliased PSC_Register;
-- auto-reload register
ARR : aliased ARR_Register_1;
-- capture/compare register 1
CCR1 : aliased CCR1_Register_1;
-- capture/compare register 2
CCR2 : aliased CCR2_Register_1;
-- capture/compare register 3
CCR3 : aliased CCR3_Register_1;
-- capture/compare register 4
CCR4 : aliased CCR4_Register_1;
-- DMA control register
DCR : aliased DCR_Register;
-- DMA address for full transfer
DMAR : aliased DMAR_Register;
-- TIM5 option register
OR_k : aliased OR_Register_1;
case Discriminent is
when Output =>
-- capture/compare mode register 1 (output mode)
CCMR1_Output : aliased CCMR1_Output_Register;
-- capture/compare mode register 2 (output mode)
CCMR2_Output : aliased CCMR2_Output_Register_1;
when Input =>
-- capture/compare mode register 1 (input mode)
CCMR1_Input : aliased CCMR1_Input_Register;
-- capture/compare mode register 2 (input mode)
CCMR2_Input : aliased CCMR2_Input_Register;
end case;
end record
with Unchecked_Union, Volatile;
for TIM5_Peripheral use record
CR1 at 16#0# range 0 .. 31;
CR2 at 16#4# range 0 .. 31;
SMCR at 16#8# range 0 .. 31;
DIER at 16#C# range 0 .. 31;
SR at 16#10# range 0 .. 31;
EGR at 16#14# range 0 .. 31;
CCER at 16#20# range 0 .. 31;
CNT at 16#24# range 0 .. 31;
PSC at 16#28# range 0 .. 31;
ARR at 16#2C# range 0 .. 31;
CCR1 at 16#34# range 0 .. 31;
CCR2 at 16#38# range 0 .. 31;
CCR3 at 16#3C# range 0 .. 31;
CCR4 at 16#40# range 0 .. 31;
DCR at 16#48# range 0 .. 31;
DMAR at 16#4C# range 0 .. 31;
OR_k at 16#50# range 0 .. 31;
CCMR1_Output at 16#18# range 0 .. 31;
CCMR2_Output at 16#1C# range 0 .. 31;
CCMR1_Input at 16#18# range 0 .. 31;
CCMR2_Input at 16#1C# range 0 .. 31;
end record;
-- General-purpose-timers
TIM5_Periph : aliased TIM5_Peripheral
with Import, Address => System'To_Address (16#40000C00#);
type TIM9_Disc is
(
Output,
Input);
-- General purpose timers
type TIM9_Peripheral
(Discriminent : TIM9_Disc := Output)
is record
-- control register 1
CR1 : aliased CR1_Register_1;
-- control register 2
CR2 : aliased CR2_Register_2;
-- slave mode control register
SMCR : aliased SMCR_Register_1;
-- DMA/Interrupt enable register
DIER : aliased DIER_Register_2;
-- status register
SR : aliased SR_Register_2;
-- event generation register
EGR : aliased EGR_Register_2;
-- capture/compare enable register
CCER : aliased CCER_Register_2;
-- counter
CNT : aliased CNT_Register;
-- prescaler
PSC : aliased PSC_Register;
-- auto-reload register
ARR : aliased ARR_Register;
-- capture/compare register 1
CCR1 : aliased CCR1_Register;
-- capture/compare register 2
CCR2 : aliased CCR2_Register;
case Discriminent is
when Output =>
-- capture/compare mode register 1 (output mode)
CCMR1_Output : aliased CCMR1_Output_Register_1;
when Input =>
-- capture/compare mode register 1 (input mode)
CCMR1_Input : aliased CCMR1_Input_Register_1;
end case;
end record
with Unchecked_Union, Volatile;
for TIM9_Peripheral use record
CR1 at 16#0# range 0 .. 31;
CR2 at 16#4# range 0 .. 31;
SMCR at 16#8# range 0 .. 31;
DIER at 16#C# range 0 .. 31;
SR at 16#10# range 0 .. 31;
EGR at 16#14# range 0 .. 31;
CCER at 16#20# range 0 .. 31;
CNT at 16#24# range 0 .. 31;
PSC at 16#28# range 0 .. 31;
ARR at 16#2C# range 0 .. 31;
CCR1 at 16#34# range 0 .. 31;
CCR2 at 16#38# range 0 .. 31;
CCMR1_Output at 16#18# range 0 .. 31;
CCMR1_Input at 16#18# range 0 .. 31;
end record;
-- General purpose timers
TIM9_Periph : aliased TIM9_Peripheral
with Import, Address => System'To_Address (16#40014000#);
type TIM10_Disc is
(
Output,
Input);
-- General-purpose-timers
type TIM10_Peripheral
(Discriminent : TIM10_Disc := Output)
is record
-- control register 1
CR1 : aliased CR1_Register_2;
-- DMA/Interrupt enable register
DIER : aliased DIER_Register_3;
-- status register
SR : aliased SR_Register_3;
-- event generation register
EGR : aliased EGR_Register_3;
-- capture/compare enable register
CCER : aliased CCER_Register_3;
-- counter
CNT : aliased CNT_Register;
-- prescaler
PSC : aliased PSC_Register;
-- auto-reload register
ARR : aliased ARR_Register;
-- capture/compare register 1
CCR1 : aliased CCR1_Register;
case Discriminent is
when Output =>
-- capture/compare mode register 1 (output mode)
CCMR1_Output : aliased CCMR1_Output_Register_2;
when Input =>
-- capture/compare mode register 1 (input mode)
CCMR1_Input : aliased CCMR1_Input_Register_2;
end case;
end record
with Unchecked_Union, Volatile;
for TIM10_Peripheral use record
CR1 at 16#0# range 0 .. 31;
DIER at 16#C# range 0 .. 31;
SR at 16#10# range 0 .. 31;
EGR at 16#14# range 0 .. 31;
CCER at 16#20# range 0 .. 31;
CNT at 16#24# range 0 .. 31;
PSC at 16#28# range 0 .. 31;
ARR at 16#2C# range 0 .. 31;
CCR1 at 16#34# range 0 .. 31;
CCMR1_Output at 16#18# range 0 .. 31;
CCMR1_Input at 16#18# range 0 .. 31;
end record;
-- General-purpose-timers
TIM10_Periph : aliased TIM10_Peripheral
with Import, Address => System'To_Address (16#40014400#);
type TIM11_Disc is
(
Output,
Input);
-- General-purpose-timers
type TIM11_Peripheral
(Discriminent : TIM11_Disc := Output)
is record
-- control register 1
CR1 : aliased CR1_Register_2;
-- DMA/Interrupt enable register
DIER : aliased DIER_Register_3;
-- status register
SR : aliased SR_Register_3;
-- event generation register
EGR : aliased EGR_Register_3;
-- capture/compare enable register
CCER : aliased CCER_Register_3;
-- counter
CNT : aliased CNT_Register;
-- prescaler
PSC : aliased PSC_Register;
-- auto-reload register
ARR : aliased ARR_Register;
-- capture/compare register 1
CCR1 : aliased CCR1_Register;
-- option register
OR_k : aliased OR_Register_2;
case Discriminent is
when Output =>
-- capture/compare mode register 1 (output mode)
CCMR1_Output : aliased CCMR1_Output_Register_2;
when Input =>
-- capture/compare mode register 1 (input mode)
CCMR1_Input : aliased CCMR1_Input_Register_2;
end case;
end record
with Unchecked_Union, Volatile;
for TIM11_Peripheral use record
CR1 at 16#0# range 0 .. 31;
DIER at 16#C# range 0 .. 31;
SR at 16#10# range 0 .. 31;
EGR at 16#14# range 0 .. 31;
CCER at 16#20# range 0 .. 31;
CNT at 16#24# range 0 .. 31;
PSC at 16#28# range 0 .. 31;
ARR at 16#2C# range 0 .. 31;
CCR1 at 16#34# range 0 .. 31;
OR_k at 16#50# range 0 .. 31;
CCMR1_Output at 16#18# range 0 .. 31;
CCMR1_Input at 16#18# range 0 .. 31;
end record;
-- General-purpose-timers
TIM11_Periph : aliased TIM11_Peripheral
with Import, Address => System'To_Address (16#40014800#);
end STM32_SVD.TIM;
|
google-code/ada-util | Ada | 8,415 | ads | -----------------------------------------------------------------------
-- util-serialize-io-xml -- XML Serialization Driver
-- 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 Sax.Exceptions;
with Sax.Locators;
with Sax.Readers;
with Sax.Attributes;
with Unicode.CES;
with Input_Sources;
with Ada.Strings.Unbounded;
with Util.Streams.Buffered;
with Util.Streams.Texts;
package Util.Serialize.IO.XML is
Parse_Error : exception;
type Parser is new Serialize.IO.Parser with private;
-- Parse the stream using the JSON parser.
procedure Parse (Handler : in out Parser;
Stream : in out Util.Streams.Buffered.Buffered_Stream'Class);
-- Set the XHTML reader to ignore or not the white spaces.
-- When set to True, the ignorable white spaces will not be kept.
procedure Set_Ignore_White_Spaces (Reader : in out Parser;
Value : in Boolean);
-- Set the XHTML reader to ignore empty lines.
procedure Set_Ignore_Empty_Lines (Reader : in out Parser;
Value : in Boolean);
-- Get the current location (file and line) to report an error message.
function Get_Location (Handler : in Parser) return String;
type Xhtml_Reader is new Sax.Readers.Reader with private;
-- ------------------------------
-- XML Output Stream
-- ------------------------------
-- The <b>Output_Stream</b> provides methods for creating an XML output stream.
-- The stream object takes care of the XML escape rules.
type Output_Stream is
new Util.Streams.Texts.Print_Stream and Util.Serialize.IO.Output_Stream with private;
-- Write the value as a XML string. Special characters are escaped using the XML
-- escape rules.
procedure Write_String (Stream : in out Output_Stream;
Value : in String);
-- Write the value as a XML string. Special characters are escaped using the XML
-- escape rules.
procedure Write_String (Stream : in out Output_Stream;
Value : in Util.Beans.Objects.Object);
-- Start a new XML object.
procedure Start_Entity (Stream : in out Output_Stream;
Name : in String);
-- Terminates the current XML object.
procedure End_Entity (Stream : in out Output_Stream;
Name : in String);
-- Write a XML name/value attribute.
procedure Write_Attribute (Stream : in out Output_Stream;
Name : in String;
Value : in Util.Beans.Objects.Object);
-- Write a XML name/value entity (see Write_Attribute).
procedure Write_Entity (Stream : in out Output_Stream;
Name : in String;
Value : in Util.Beans.Objects.Object);
-- Starts a XML array.
procedure Start_Array (Stream : in out Output_Stream;
Length : in Ada.Containers.Count_Type);
-- Terminates a XML array.
procedure End_Array (Stream : in out Output_Stream);
-- Return the location where the exception was raised.
function Get_Location (Except : Sax.Exceptions.Sax_Parse_Exception'Class)
return String;
private
overriding
procedure Warning (Handler : in out Xhtml_Reader;
Except : in Sax.Exceptions.Sax_Parse_Exception'Class);
overriding
procedure Error (Handler : in out Xhtml_Reader;
Except : in Sax.Exceptions.Sax_Parse_Exception'Class);
overriding
procedure Fatal_Error (Handler : in out Xhtml_Reader;
Except : in Sax.Exceptions.Sax_Parse_Exception'Class);
overriding
procedure Set_Document_Locator (Handler : in out Xhtml_Reader;
Loc : in out Sax.Locators.Locator);
overriding
procedure Start_Document (Handler : in out Xhtml_Reader);
overriding
procedure End_Document (Handler : in out Xhtml_Reader);
overriding
procedure Start_Prefix_Mapping (Handler : in out Xhtml_Reader;
Prefix : in Unicode.CES.Byte_Sequence;
URI : in Unicode.CES.Byte_Sequence);
overriding
procedure End_Prefix_Mapping (Handler : in out Xhtml_Reader;
Prefix : in Unicode.CES.Byte_Sequence);
overriding
procedure Start_Element (Handler : in out Xhtml_Reader;
Namespace_URI : in Unicode.CES.Byte_Sequence := "";
Local_Name : in Unicode.CES.Byte_Sequence := "";
Qname : in Unicode.CES.Byte_Sequence := "";
Atts : in Sax.Attributes.Attributes'Class);
overriding
procedure End_Element (Handler : in out Xhtml_Reader;
Namespace_URI : in Unicode.CES.Byte_Sequence := "";
Local_Name : in Unicode.CES.Byte_Sequence := "";
Qname : in Unicode.CES.Byte_Sequence := "");
overriding
procedure Characters (Handler : in out Xhtml_Reader;
Ch : in Unicode.CES.Byte_Sequence);
overriding
procedure Ignorable_Whitespace (Handler : in out Xhtml_Reader;
Ch : in Unicode.CES.Byte_Sequence);
overriding
procedure Processing_Instruction (Handler : in out Xhtml_Reader;
Target : in Unicode.CES.Byte_Sequence;
Data : in Unicode.CES.Byte_Sequence);
overriding
procedure Skipped_Entity (Handler : in out Xhtml_Reader;
Name : in Unicode.CES.Byte_Sequence);
overriding
procedure Start_Cdata (Handler : in out Xhtml_Reader);
overriding
procedure End_Cdata (Handler : in out Xhtml_Reader);
overriding
function Resolve_Entity (Handler : Xhtml_Reader;
Public_Id : Unicode.CES.Byte_Sequence;
System_Id : Unicode.CES.Byte_Sequence)
return Input_Sources.Input_Source_Access;
overriding
procedure Start_DTD (Handler : in out Xhtml_Reader;
Name : Unicode.CES.Byte_Sequence;
Public_Id : Unicode.CES.Byte_Sequence := "";
System_Id : Unicode.CES.Byte_Sequence := "");
procedure Collect_Text (Handler : in out Xhtml_Reader;
Content : Unicode.CES.Byte_Sequence);
type Xhtml_Reader is new Sax.Readers.Reader with record
Stack_Pos : Natural := 0;
Handler : access Parser'Class;
Text : Ada.Strings.Unbounded.Unbounded_String;
-- Whether white spaces can be ignored.
Ignore_White_Spaces : Boolean := True;
-- Whether empty lines should be ignored (when white spaces are kept).
Ignore_Empty_Lines : Boolean := True;
end record;
type Parser is new Util.Serialize.IO.Parser with record
-- The SAX locator to find the current file and line number.
Locator : Sax.Locators.Locator;
Has_Pending_Char : Boolean := False;
Pending_Char : Character;
-- Whether white spaces can be ignored.
Ignore_White_Spaces : Boolean := True;
-- Whether empty lines should be ignored (when white spaces are kept).
Ignore_Empty_Lines : Boolean := True;
end record;
type Output_Stream is
new Util.Streams.Texts.Print_Stream and Util.Serialize.IO.Output_Stream with record
Close_Start : Boolean := False;
end record;
end Util.Serialize.IO.XML;
|
AdamSzerszen/Concurrency_v.2.0 | Ada | 460 | ads | with Units; use Units;
package Infrastructure is
type Steering;
type Steering_ptr is access Steering;
protected type Steering is
entry SetNumber(CorrectNumber: in SteeringNumber);
entry Incoming(CurrentTram: in TramNumber);
entry Leaving;
entry CheckStatus;
private
CurrentlyOccupied: Boolean := False;
OccupierNumber: TramNumber;
OwnNumber: SteeringNumber := -1;
end Steering;
end Infrastructure;
|
simonjwright/sdlada | Ada | 22,485 | adb | --------------------------------------------------------------------------------------------------------------------
-- Copyright (c) 2013-2020, Luke A. Guest
--
-- This software is provided 'as-is', without any express or implied
-- warranty. In no event will the authors be held liable for any damages
-- arising from the use of this software.
--
-- Permission is granted to anyone to use this software for any purpose,
-- including commercial applications, and to alter it and redistribute it
-- freely, subject to the following restrictions:
--
-- 1. The origin of this software must not be misrepresented; you must not
-- claim that you wrote the original software. If you use this software
-- in a product, an acknowledgment in the product documentation would be
-- appreciated but is not required.
--
-- 2. Altered source versions must be plainly marked as such, and must not be
-- misrepresented as being the original software.
--
-- 3. This notice may not be removed or altered from any source
-- distribution.
--------------------------------------------------------------------------------------------------------------------
with Interfaces.C;
with SDL.Error;
package body SDL.Video.Renderers is
package C renames Interfaces.C;
use type SDL.C_Pointers.Renderer_Pointer;
type Internal_Flip is mod 2 ** 32 with
Convention => C;
-- type Internal_Flip_Array is array (Renderer_Flip) of Internal_Flip;
Internal_Flip_None : constant Internal_Flip := 16#0000_0000#;
Internal_Flip_Horizontal : constant Internal_Flip := 16#0000_0001#;
Internal_Flip_Vertical : constant Internal_Flip := 16#0000_0002#;
Internal_Flips : constant array (Renderer_Flip) of Internal_Flip :=
(Internal_Flip_None,
Internal_Flip_Horizontal,
Internal_Flip_Vertical,
Internal_Flip_Horizontal or Internal_Flip_Vertical);
function Get_Internal_Window (Self : in SDL.Video.Windows.Window) return SDL.C_Pointers.Windows_Pointer with
Convention => Ada,
Import => True;
function Get_Internal_Texture (Self : in SDL.Video.Textures.Texture) return SDL.C_Pointers.Texture_Pointer with
Import => True,
Convention => Ada;
function Total_Drivers return Positive is
function SDL_Get_Num_Render_Drivers return C.int with
Import => True,
Convention => C,
External_Name => "SDL_GetNumRenderDrivers";
Result : constant C.int := SDL_Get_Num_Render_Drivers;
begin
if Result < C.int (Positive'First) then
raise Renderer_Error with SDL.Error.Get;
end if;
return Positive (Result);
end Total_Drivers;
overriding
procedure Finalize (Self : in out Renderer) is
procedure SDL_Destroy_Renderer (R : in SDL.C_Pointers.Renderer_Pointer) with
Import => True,
Convention => C,
External_Name => "SDL_DestroyRenderer";
begin
if Self.Internal /= null and then Self.Owns then
SDL_Destroy_Renderer (Self.Internal);
Self.Internal := null;
end if;
end Finalize;
function Get_Blend_Mode (Self : in Renderer) return Blend_Modes is
function SDL_Get_Render_Draw_Blend_Mode (R : in SDL.C_Pointers.Renderer_Pointer;
M : out Blend_Modes) return C.int with
Import => True,
Convention => C,
External_Name => "SDL_GetRenderDrawBlendMode";
Mode : Blend_Modes;
Result : constant C.int := SDL_Get_Render_Draw_Blend_Mode (Self.Internal, Mode);
begin
if Result /= Success then
raise Renderer_Error with SDL.Error.Get;
end if;
return Mode;
end Get_Blend_Mode;
procedure Set_Blend_Mode (Self : in out Renderer; Mode : in Blend_Modes) is
function SDL_Set_Render_Draw_Blend_Mode (R : in SDL.C_Pointers.Renderer_Pointer;
M : in Blend_Modes) return C.int with
Import => True,
Convention => C,
External_Name => "SDL_SetRenderDrawBlendMode";
Result : constant C.int := SDL_Set_Render_Draw_Blend_Mode (Self.Internal, Mode);
begin
if Result /= Success then
raise Renderer_Error with SDL.Error.Get;
end if;
end Set_Blend_Mode;
function Get_Draw_Colour (Self : in Renderer) return SDL.Video.Palettes.Colour is
function SDL_Get_Render_Draw_Color
(R : in SDL.C_Pointers.Renderer_Pointer;
Red, Green, Blue, Alpha : out SDL.Video.Palettes.Colour_Component) return C.int with
Import => True,
Convention => C,
External_Name => "SDL_GetRenderDrawColor";
Colour : SDL.Video.Palettes.Colour;
Result : constant C.int := SDL_Get_Render_Draw_Color (Self.Internal,
Colour.Red,
Colour.Green,
Colour.Blue,
Colour.Alpha);
begin
if Result /= Success then
raise Renderer_Error with SDL.Error.Get;
end if;
return Colour;
end Get_Draw_Colour;
procedure Set_Draw_Colour (Self : in out Renderer; Colour : in SDL.Video.Palettes.Colour) is
function SDL_Set_Render_Draw_Color
(R : in SDL.C_Pointers.Renderer_Pointer;
Red, Green, Blue, Alpha : in SDL.Video.Palettes.Colour_Component) return C.int with
Import => True,
Convention => C,
External_Name => "SDL_SetRenderDrawColor";
Result : constant C.int := SDL_Set_Render_Draw_Color (Self.Internal,
Colour.Red,
Colour.Green,
Colour.Blue,
Colour.Alpha);
begin
if Result /= Success then
raise Renderer_Error with SDL.Error.Get;
end if;
end Set_Draw_Colour;
procedure Clear (Self : in out Renderer) is
function SDL_Render_Clear (R : in SDL.C_Pointers.Renderer_Pointer) return C.int with
Import => True,
Convention => C,
External_Name => "SDL_RenderClear";
Result : constant C.int := SDL_Render_Clear (Self.Internal);
begin
if Result /= Success then
raise Renderer_Error with SDL.Error.Get;
end if;
end Clear;
procedure Copy
(Self : in out Renderer;
Copy_From : in SDL.Video.Textures.Texture) is
function SDL_Render_Copy
(R : in SDL.C_Pointers.Renderer_Pointer;
T : in SDL.C_Pointers.Texture_Pointer;
Src, Dest : in SDL.Video.Rectangles.Rectangle_Access) return C.int with
Import => True,
Convention => C,
External_Name => "SDL_RenderCopy";
Result : constant C.int := SDL_Render_Copy (Self.Internal,
Get_Internal_Texture (Copy_From),
null,
null);
begin
if Result /= Success then
raise Renderer_Error with SDL.Error.Get;
end if;
end Copy;
-- TODO: Check to make sure this works, if it does, apply the same logic to CopyEx, see below.
procedure Copy
(Self : in out Renderer;
Copy_From : in SDL.Video.Textures.Texture;
From : in SDL.Video.Rectangles.Rectangle;
To : in SDL.Video.Rectangles.Rectangle) is
function SDL_Render_Copy
(R : in SDL.C_Pointers.Renderer_Pointer;
T : in SDL.C_Pointers.Texture_Pointer;
Src, Dest : in SDL.Video.Rectangles.Rectangle) return C.int with
Import => True,
Convention => C,
External_Name => "SDL_RenderCopy";
Result : constant C.int := SDL_Render_Copy (Self.Internal,
Get_Internal_Texture (Copy_From),
From,
To);
begin
if Result /= Success then
raise Renderer_Error with SDL.Error.Get;
end if;
end Copy;
procedure Copy
(Self : in out Renderer;
Copy_From : in SDL.Video.Textures.Texture;
To : in SDL.Video.Rectangles.Rectangle) is
function SDL_Render_Copy
(R : in SDL.C_Pointers.Renderer_Pointer;
T : in SDL.C_Pointers.Texture_Pointer;
Src : in SDL.Video.Rectangles.Rectangle_Access;
Dest : in SDL.Video.Rectangles.Rectangle) return C.int with
Import => True,
Convention => C,
External_Name => "SDL_RenderCopy";
Result : constant C.int := SDL_Render_Copy (Self.Internal,
Get_Internal_Texture (Copy_From),
null,
To);
begin
if Result /= Success then
raise Renderer_Error with SDL.Error.Get;
end if;
end Copy;
-- TODO: See above, rearrange the params so that the rectangles are the last elements and make
-- them default to null_rectangle.
procedure Copy
(Self : in out Renderer;
Copy_From : in SDL.Video.Textures.Texture;
From : in SDL.Video.Rectangles.Rectangle;
To : in SDL.Video.Rectangles.Rectangle;
Angle : in Long_Float;
Centre : in SDL.Video.Rectangles.Point;
Flip : in Renderer_Flip) is
function SDL_Render_Copy_Ex
(R : in SDL.C_Pointers.Renderer_Pointer;
T : in SDL.C_Pointers.Texture_Pointer;
Src, Dest : in SDL.Video.Rectangles.Rectangle;
A : in C.double;
Centre : in SDL.Video.Rectangles.Point;
F : in Internal_Flip) return C.int with
Import => True,
Convention => C,
External_Name => "SDL_RenderCopyEx";
Result : constant C.int := SDL_Render_Copy_Ex (Self.Internal,
Get_Internal_Texture (Copy_From),
From,
To,
C.double (Angle),
Centre,
Internal_Flips (Flip));
begin
if Result /= Success then
raise Renderer_Error with SDL.Error.Get;
end if;
end Copy;
procedure Draw (Self : in out Renderer; Line : in SDL.Video.Rectangles.Line_Segment) is
function SDL_Render_Draw_Line (R : in SDL.C_Pointers.Renderer_Pointer;
X1, Y1, X2, Y2 : in C.int) return C.int with
Import => True,
Convention => C,
External_Name => "SDL_RenderDrawLine";
Result : constant C.int := SDL_Render_Draw_Line (Self.Internal,
Line.Start.X,
Line.Start.Y,
Line.Finish.X,
Line.Finish.Y);
begin
if Result /= Success then
raise Renderer_Error with SDL.Error.Get;
end if;
end Draw;
-- TODO: Check this works!
procedure Draw (Self : in out Renderer; Lines : in SDL.Video.Rectangles.Line_Arrays) is
-- As the records and arrays are defined as C types, an array of lines is also an array of points.
function SDL_Render_Draw_Lines (R : in SDL.C_Pointers.Renderer_Pointer;
P : in SDL.Video.Rectangles.Line_Arrays;
Count : in C.int) return C.int with
Import => True,
Convention => C,
External_Name => "SDL_RenderDrawLines";
Result : constant C.int := SDL_Render_Draw_Lines (Self.Internal, Lines, C.int (Lines'Length * 2));
begin
if Result /= Success then
raise Renderer_Error with SDL.Error.Get;
end if;
end Draw;
procedure Draw (Self : in out Renderer; Point : in SDL.Video.Rectangles.Point) is
function SDL_Render_Draw_Point (R : in SDL.C_Pointers.Renderer_Pointer; X, Y : in C.int) return C.int with
Import => True,
Convention => C,
External_Name => "SDL_RenderDrawPoint";
Result : constant C.int := SDL_Render_Draw_Point (Self.Internal, Point.X, Point.Y);
begin
if Result /= Success then
raise Renderer_Error with SDL.Error.Get;
end if;
end Draw;
procedure Draw (Self : in out Renderer; Points : in SDL.Video.Rectangles.Point_Arrays) is
function SDL_Render_Draw_Points (R : in SDL.C_Pointers.Renderer_Pointer;
P : in SDL.Video.Rectangles.Point_Arrays;
Count : in C.int) return C.int with
Import => True,
Convention => C,
External_Name => "SDL_RenderDrawPoints";
Result : constant C.int := SDL_Render_Draw_Points (Self.Internal, Points, C.int (Points'Length));
begin
if Result /= Success then
raise Renderer_Error with SDL.Error.Get;
end if;
end Draw;
procedure Draw (Self : in out Renderer; Rectangle : in SDL.Video.Rectangles.Rectangle) is
function SDL_Render_Draw_Rect (R : in SDL.C_Pointers.Renderer_Pointer;
Rect : in SDL.Video.Rectangles.Rectangle) return C.int with
Import => True,
Convention => C,
External_Name => "SDL_RenderDrawRect";
Result : constant C.int := SDL_Render_Draw_Rect (Self.Internal, Rectangle);
begin
if Result /= Success then
raise Renderer_Error with SDL.Error.Get;
end if;
end Draw;
procedure Draw (Self : in out Renderer; Rectangles : in SDL.Video.Rectangles.Rectangle_Arrays) is
function SDL_Render_Draw_Rects (R : in SDL.C_Pointers.Renderer_Pointer;
Rect : in SDL.Video.Rectangles.Rectangle_Arrays;
Count : in C.int) return C.int with
Import => True,
Convention => C,
External_Name => "SDL_RenderDrawRects";
Result : constant C.int := SDL_Render_Draw_Rects (Self.Internal, Rectangles, C.int (Rectangles'Length));
begin
if Result /= Success then
raise Renderer_Error with SDL.Error.Get;
end if;
end Draw;
procedure Fill (Self : in out Renderer; Rectangle : in SDL.Video.Rectangles.Rectangle) is
function SDL_Render_Fill_Rect (R : in SDL.C_Pointers.Renderer_Pointer;
Rect : in SDL.Video.Rectangles.Rectangle) return C.int with
Import => True,
Convention => C,
External_Name => "SDL_RenderFillRect";
Result : constant C.int := SDL_Render_Fill_Rect (Self.Internal, Rectangle);
begin
if Result /= Success then
raise Renderer_Error with SDL.Error.Get;
end if;
end Fill;
procedure Fill (Self : in out Renderer; Rectangles : in SDL.Video.Rectangles.Rectangle_Arrays) is
function SDL_Render_Fill_Rects (R : in SDL.C_Pointers.Renderer_Pointer;
Rect : in SDL.Video.Rectangles.Rectangle_Arrays;
Count : in C.int) return C.int with
Import => True,
Convention => C,
External_Name => "SDL_RenderFillRects";
Result : constant C.int := SDL_Render_Fill_Rects (Self.Internal, Rectangles, C.int (Rectangles'Length));
begin
if Result /= Success then
raise Renderer_Error with SDL.Error.Get;
end if;
end Fill;
procedure Get_Clip (Self : in Renderer; Rectangle : out SDL.Video.Rectangles.Rectangle) is
procedure SDL_Render_Get_Clip_Rect (R : in SDL.C_Pointers.Renderer_Pointer;
Rect : out SDL.Video.Rectangles.Rectangle) with
Import => True,
Convention => C,
External_Name => "SDL_RenderGetClipRect";
begin
SDL_Render_Get_Clip_Rect (Self.Internal, Rectangle);
end Get_Clip;
procedure Set_Clip (Self : in out Renderer; Rectangle : in SDL.Video.Rectangles.Rectangle) is
function SDL_Render_Set_Clip_Rect (R : in SDL.C_Pointers.Renderer_Pointer;
Rect : in SDL.Video.Rectangles.Rectangle) return C.int with
Import => True,
Convention => C,
External_Name => "SDL_RenderSetClipRect";
Result : constant C.int := SDL_Render_Set_Clip_Rect (Self.Internal, Rectangle);
begin
if Result /= Success then
raise Renderer_Error with SDL.Error.Get;
end if;
end Set_Clip;
procedure Get_Logical_Size (Self : in Renderer; Size : out SDL.Sizes) is
procedure SDL_Render_Get_Logical_Size (R : in SDL.C_Pointers.Renderer_Pointer;
W : out SDL.Dimension;
H : out SDL.Dimension) with
Import => True,
Convention => C,
External_Name => "SDL_RenderGetLogicalSize";
begin
SDL_Render_Get_Logical_Size (Self.Internal, Size.Width, Size.Height);
end Get_Logical_Size;
procedure Set_Logical_Size (Self : in out Renderer; Size : in SDL.Sizes) is
function SDL_Render_Set_Logical_Size (R : in SDL.C_Pointers.Renderer_Pointer;
W : in SDL.Dimension;
H : in SDL.Dimension) return C.int with
Import => True,
Convention => C,
External_Name => "SDL_RenderSetLogicalSize";
Result : constant C.int := SDL_Render_Set_Logical_Size (Self.Internal, Size.Width, Size.Height);
begin
if Result /= Success then
raise Renderer_Error with SDL.Error.Get;
end if;
end Set_Logical_Size;
procedure Get_Scale (Self : in Renderer; X, Y : out Float) is
procedure SDL_Render_Get_Scale (R : in SDL.C_Pointers.Renderer_Pointer; X, Y : out C.C_float) with
Import => True,
Convention => C,
External_Name => "SDL_RenderGetScale";
begin
SDL_Render_Get_Scale (Self.Internal, C.C_float (X), C.C_float (Y));
end Get_Scale;
procedure Set_Scale (Self : in out Renderer; X, Y : in Float) is
function SDL_Render_Set_Scale (R : in SDL.C_Pointers.Renderer_Pointer; X, Y : in C.C_float) return C.int with
Import => True,
Convention => C,
External_Name => "SDL_RenderSetScale";
Result : constant C.int := SDL_Render_Set_Scale (Self.Internal, C.C_float (X), C.C_float (Y));
begin
if Result /= Success then
raise Renderer_Error with SDL.Error.Get;
end if;
end Set_Scale;
procedure Get_Viewport (Self : in Renderer; Rectangle : out SDL.Video.Rectangles.Rectangle) is
procedure SDL_Render_Get_Viewport (R : in SDL.C_Pointers.Renderer_Pointer;
Rect : out SDL.Video.Rectangles.Rectangle) with
Import => True,
Convention => C,
External_Name => "SDL_RenderGetViewport";
begin
SDL_Render_Get_Viewport (Self.Internal, Rectangle);
end Get_Viewport;
procedure Set_Viewport (Self : in out Renderer; Rectangle : in SDL.Video.Rectangles.Rectangle) is
function SDL_Render_Set_Viewport (R : in SDL.C_Pointers.Renderer_Pointer;
Rect : in SDL.Video.Rectangles.Rectangle) return C.int with
Import => True,
Convention => C,
External_Name => "SDL_RenderSetViewport";
Result : constant C.int := SDL_Render_Set_Viewport (Self.Internal, Rectangle);
begin
if Result /= Success then
raise Renderer_Error with SDL.Error.Get;
end if;
end Set_Viewport;
procedure Present (Self : in Renderer) is
procedure SDL_Render_Present (R : in SDL.C_Pointers.Renderer_Pointer) with
Import => True,
Convention => C,
External_Name => "SDL_RenderPresent";
begin
SDL_Render_Present (Self.Internal);
end Present;
function Supports_Targets (Self : in Renderer) return Boolean is
function SDL_Render_Target_Supported (R : in SDL.C_Pointers.Renderer_Pointer) return SDL_Bool with
Import => True,
Convention => C,
External_Name => "SDL_RenderTargetSupported";
begin
return (if SDL_Render_Target_Supported (Self.Internal) = SDL_True then True else False);
end Supports_Targets;
procedure Set_Target (Self : in out Renderer; Target : in SDL.Video.Textures.Texture) is
function SDL_Set_Render_Target (R : in SDL.C_Pointers.Renderer_Pointer;
T : in SDL.C_Pointers.Texture_Pointer) return C.int with
Import => True,
Convention => C,
External_Name => "SDL_SetRenderTarget";
Result : constant C.int := SDL_Set_Render_Target (Self.Internal, Get_Internal_Texture (Target));
begin
if Result /= Success then
raise Renderer_Error with SDL.Error.Get;
end if;
end Set_Target;
function Get_Renderer (Window : in SDL.Video.Windows.Window) return Renderer is
function SDL_Get_Renderer (W : in SDL.C_Pointers.Windows_Pointer) return SDL.C_Pointers.Renderer_Pointer with
Import => True,
Convention => C,
External_Name => "SDL_GetRenderer";
begin
return Result : constant Renderer :=
(Ada.Finalization.Limited_Controlled with
Internal => SDL_Get_Renderer (Get_Internal_Window (Window)), Owns => False) do
null;
end return;
end Get_Renderer;
function Get_Internal_Renderer (Self : in Renderer) return SDL.C_Pointers.Renderer_Pointer is
begin
return Self.Internal;
end Get_Internal_Renderer;
end SDL.Video.Renderers;
|
strenkml/EE368 | Ada | 2,514 | adb |
with Memory.Split; use Memory.Split;
with Memory.Container; use Memory.Container;
with Util; use Util;
separate (Parser)
procedure Parse_Split(parser : in out Parser_Type;
result : out Memory_Pointer) is
split : Split_Pointer := Create_Split;
mem : Memory_Pointer := null;
bank0 : Memory_Pointer := null;
bank1 : Memory_Pointer := null;
offset : Address_Type := 0;
begin
Push_Wrapper(parser, Wrapper_Pointer(split), 2);
while Get_Type(parser) = Open loop
Match(parser, Open);
declare
name : constant String := Get_Value(parser);
begin
Match(parser, Literal);
if name = "bank0" then
if bank0 = null then
Parse_Memory(parser, bank0);
else
Destroy(bank0);
Raise_Error(parser, "duplicate bank0 in split");
end if;
elsif name = "bank1" then
if bank1 = null then
Parse_Memory(parser, bank1);
else
Destroy(bank1);
Raise_Error(parser, "duplicate bank1 in split");
end if;
elsif name = "memory" then
if mem = null then
Parse_Memory(parser, mem);
else
Destroy(mem);
Raise_Error(parser, "duplicate memory in split");
end if;
else
declare
value : constant String := Get_Value(parser);
begin
Match(parser, Literal);
if name = "offset" then
offset := Address_Type'Value(value);
else
Raise_Error(parser,
"invalid attribute in split: " & name);
end if;
end;
end if;
end;
Match(parser, Close);
end loop;
if bank0 = null then
Raise_Error(parser, "bank0 not specified in split");
elsif bank1 = null then
Raise_Error(parser, "bank1 not specified in split");
elsif mem = null then
Raise_Error(parser, "memory not specified in split");
end if;
Set_Bank(split.all, 0, bank0);
Set_Bank(split.all, 1, bank1);
Set_Memory(split.all, mem);
Set_Offset(split.all, offset);
result := Memory_Pointer(split);
exception
when Data_Error | Constraint_Error =>
Destroy(Memory_Pointer(split));
Delete_Wrapper(parser);
Raise_Error(parser, "invalid value in split");
end Parse_Split;
|
FROL256/ada-ray-tracer | Ada | 12,469 | adb | with Interfaces;
with Interfaces.C;
with Ada.Streams.Stream_IO;
with Ada.Numerics;
with Ada.Numerics.Float_Random;
with Ada.Numerics.Generic_Elementary_Functions;
with Ada.Strings.Unbounded;
with Ada.Text_IO;
with Vector_Math;
with Geometry;
with Lights;
with Materials;
with Pugi_Xml;
with System;
use Interfaces;
use Ada.Streams.Stream_IO;
use Ada.Numerics;
use Ada.Strings.Unbounded;
use Vector_Math;
use Geometry;
use Lights;
use Materials;
use Pugi_Xml;
use System;
package body Scene is
package Float_IO is new Ada.Text_IO.Float_IO(float);
------------------------------------------------------------------------------ begin import extern CPP code
procedure gcore_init_and_clear;
pragma Import(C, gcore_init_and_clear, "gcore_init_and_clear");
procedure gcore_destroy;
pragma Import(C, gcore_destroy, "gcore_destroy");
function gcore_add_mesh_3f(a_vertices4f : Address; a_vertexNum : Integer;
a_indices : Address; a_indicesNum : Integer) return Integer;
pragma Import(C, gcore_add_mesh_3f, "gcore_add_mesh_3f");
procedure gcore_instance_meshes(a_geomId : Integer; a_matrices : Address; a_matrixNum : Integer);
pragma Import(C, gcore_instance_meshes, "gcore_instance_meshes");
procedure gcore_commit_scene;
pragma Import(C, gcore_commit_scene, "gcore_commit_scene");
type Myfloat2 is array (0 .. 2) of float;
type Myfloat3 is array (0 .. 3) of float;
type HitCpp is record
primIndex : integer := -1;
geomIndex : integer := -1;
instIndex : integer := -1;
t : float := 0.0;
normal : Myfloat3;
texCoord : Myfloat2;
end record;
function gcore_closest_hit(a_rayPos : Address; a_rayDir : Address; t_near : float; t_far : float; pHit : Address) return Interfaces.C.char;
pragma Import(C, gcore_closest_hit, "gcore_closest_hit");
------------------------------------------------------------------------------ end import extern CPP code
function Count_Childs(node : in XML_Node) return Integer is
childNum : Integer := 0;
chld : XML_Node;
begin
chld := node.first_child;
while not chld.Is_Null loop
childNum := childNum + 1;
chld := chld.next;
end loop;
return childNum;
end Count_Childs;
procedure Load_Meshes(a_lib : in XML_Node; a_folder : in String; result : out Mesh_Array) is
i : Integer := 0;
chld : XML_Node;
loc : Unbounded_String;
begin
chld := a_lib.first_child;
while not chld.Is_Null loop
loc := To_Unbounded_String( a_folder & "/" & chld.attribute("loc").value );
LoadMeshFromVSGF(result(i), IdentityMatrix, To_String(loc));
i := i + 1;
chld := chld.next;
end loop;
end Load_Meshes;
function Read_Float3_From_String(str : String) return float3 is
arr : array (0 .. 2) of float := (0.0, 0.0, 0.0);
coord, i, j : Integer := str'First;
begin
for coord in 0 .. 2 loop
while j <= str'Last and then str(j) /= ' ' loop -- find next space
j := j + 1;
end loop;
arr(coord) := Float'Value(str(i..j-1));
while j <= str'Last and then str(j) = ' ' loop -- now skip all spaces
j := j + 1;
end loop;
i := j;
if i = str'Last then
exit;
end if;
end loop;
return (arr(0), arr(1), arr(2));
end Read_Float3_From_String;
type float16 is array (0 .. 15) of float;
function Read_Float16_From_String(str : String) return float16 is
arr : float16;
coord, i, j : Integer := str'First;
begin
for coord in 0 .. 15 loop
while j <= str'Last and then str(j) /= ' ' loop -- find next space
j := j + 1;
end loop;
arr(coord) := Float'Value(str(i..j-1));
while j <= str'Last and then str(j) = ' ' loop -- now skip all spaces
j := j + 1;
end loop;
i := j;
if i = str'Last then
exit;
end if;
end loop;
return arr;
end Read_Float16_From_String;
-- this function is a bit specific to hydra legacy format when value an be stoored in text or in attrib 'val'
-- So it check node->attribute("val") first and if it is empty try to read float3 from node body/text
--
function Read_Float3_Val(a_node : in XML_Node) return float3 is
attr_val : XML_Attribute;
begin
if a_node.Is_Null then
return (0.0, 0.0, 0.0);
else
attr_val := a_node.attribute("val");
if not attr_val.Is_Null then
return Read_Float3_From_String(attr_val.value);
else
return Read_Float3_From_String(a_node.text);
end if;
end if;
end Read_Float3_Val;
function Create_Material_From_Node(a_mnode : in XML_Node) return MaterialRef is
diff_color : float3;
begin
diff_color := Read_Float3_Val(a_mnode.child("diffuse").child("color"));
Put("mat( "); Put(a_mnode.attribute("name").value); Put(") = ");
Put(diff_color.x'Image); Put(" "); Put(diff_color.y'Image); Put(" "); Put(diff_color.z'Image); Put_Line("");
return null;
end Create_Material_From_Node;
procedure Load_Materials(a_lib : in XML_Node; result : out Materials_Array) is
i : Integer := 0;
chld : XML_Node;
begin
chld := a_lib.first_child;
while not chld.Is_Null loop
result(i) := Create_Material_From_Node(chld);
i := i + 1;
chld := chld.next;
end loop;
end Load_Materials;
procedure Load_Textures(a_node : in XML_Node; a_folder : in String) is
i : Integer := 0;
node : XML_Node := a_node.first_child;
begin
while not node.Is_Null loop
declare
Name : String := node.attribute("name").value;
Loc : String := node.attribute("loc").value;
offset : Natural := Natural(node.attribute("offset").as_uint);
bytesize : Natural := Natural(node.attribute("bytesize").as_uint);
begin
Put("texture with name: ");
Put(Name);
Put(" offset:");
Put(Natural'Image(offset));
Put(" bytesize:");
Put_Line(Natural'Image(bytesize));
end;
node := node.Next;
end loop;
end Load_Textures;
-----------------------------------------------------------------------------------------------------
-----------------------------------------------------------------------------------------------------
-----------------------------------------------------------------------------------------------------
-----------------------------------------------------------------------------------------------------
procedure Add_Meshes_To_GCore(a_scn : in out Render_Scene) is
geomId : Integer := 0;
begin
-- pass all meshes to geometry core
--
for meshId in a_scn.meshes'First .. a_scn.meshes'Last loop
if a_scn.meshes(meshId).triangles'Size /= 0 then
geomId := gcore_add_mesh_3f(a_scn.meshes(meshId).vert_positions(0)'Address, a_scn.meshes(meshId).vert_positions'Size,
a_scn.meshes(meshId).triangles(0)'Address, (a_scn.meshes(meshId).triangles'Size)*3);
Put("geomId = "); Put_Line(geomId'Image);
end if;
end loop;
end Add_Meshes_To_GCore;
procedure Instance_All_Meshes(a_scn : in out Render_Scene; scnlib : XML_Node) is
node : XML_Node := scnlib.child("instance");
begin
Put_Line("");
while not node.Is_Null loop
declare
matrix : float16 := Read_Float16_From_String(node.attribute("matrix").value);
meshId : Integer := node.attribute("mesh_id").as_int;
begin
--Put("matrix = "); Put_Line(node.attribute("matrix").value);
for i in 0 .. 15 loop
Put(matrix(i)'Image);
Put(" ");
end loop;
Put_Line("");
gcore_instance_meshes(meshId, matrix(0)'Address, 1);
end;
node := node.Next;
end loop;
end Instance_All_Meshes;
-----------------------------------------------------------------------------------------------------
-----------------------------------------------------------------------------------------------------
-----------------------------------------------------------------------------------------------------
-----------------------------------------------------------------------------------------------------
procedure Init(a_scn : in out Render_Scene; a_path : in String) is
xmlFileName : Unbounded_String;
Document: XML_Document;
Result: XML_Parse_Result;
root: XML_Node := Document.Root;
attr: XML_Attribute;
numMat, numLights, numMeshes : Natural;
begin
--Put("c/cpp: test_add(2,3) = "); Put_Line(test_add(2,3)'Image);
xmlFileName := To_Unbounded_String(a_path & "/statex_00001.xml");
Document.Load(To_String(xmlFileName), Result => Result);
if not Result.OK then
Put(Result.Description);
Put(": xml parse status ");
Put(XML_Parse_Status'Image(Result.Status));
Put(" at offset ");
Put_Line(Natural'Image(Result.Offset));
end if;
pragma Assert(Result.OK = True);
Put_Line("[scene]: XML load success.");
root := Document.Root;
declare
texlib, matlib, lgtlib, geolib : XML_Node;
camlib, setlib, scnlib, node : XML_Node;
begin
texlib := root.child("textures_lib");
matlib := root.child("materials_lib");
lgtlib := root.child("lights_lib");
camlib := root.child("cam_lib");
geolib := root.child("geometry_lib");
setlib := root.child("render_lib");
scnlib := root.child("scenes");
pragma Assert(not matlib.Is_Null);
pragma Assert(not lgtlib.Is_Null);
pragma Assert(not geolib.Is_Null);
pragma Assert(not scnlib.Is_Null);
numMat := Count_Childs(matlib);
numLights := Count_Childs(lgtlib);
numMeshes := Count_Childs(geolib);
Put("[scene]: num(meshes ) = "); Put_Line(numMeshes'Image);
Put("[scene]: num(lights ) = "); Put_Line(numLights'Image);
Put("[scene]: num(materials) = "); Put_Line(numMat'Image);
delete(a_scn.meshes);
delete(a_scn.materials); -- #TODO: delete each material ref ...
a_scn.meshes := new Mesh_Array (0 .. numMeshes - 1);
a_scn.materials := new Materials_Array(0 .. numMat - 1);
Put_Line("");
Load_Meshes (geolib, a_path, result => a_scn.meshes.all); Put_Line("");
Load_Materials(matlib, result => a_scn.materials.all); Put_Line("");
Load_Textures (texlib, a_path); Put_Line(""); -- #TODO: implement texture load
-- now put all meshes inside embree
--
pragma Assert(a_scn.meshes.all'Size > 0);
pragma Assert(a_scn.materials.all'Size > 0);
-- pragma Assert(not matlib.Is_Null);
gcore_init_and_clear;
Add_Meshes_To_GCore(a_scn);
Instance_All_Meshes(a_scn, scnlib.child("scene"));
gcore_commit_scene;
end;
end Init;
procedure Destroy(a_scn : in out Render_Scene) is
begin
gcore_destroy;
if a_scn.meshes /= null then
delete(a_scn.meshes);
a_scn.meshes := null;
end if ;
end Destroy;
function Material_At(a_scn : in Render_Scene; id : in Integer) return Materials.MaterialRef is
begin
if id < a_scn.materials'Size then
return a_scn.materials(id);
else
return null;
end if;
end Material_At;
function Light_At (a_scn : in Render_Scene; id : in Integer) return Lights.LightRef is
begin
return a_scn.g_lightRef;
end Light_At;
function Camera_At(a_scn : in Render_Scene; id : in Integer) return Camera is
begin
return a_scn.g_cam;
end Camera_At;
function Find_Closest_Hit(a_scn : in Render_Scene; r : in Geometry.Ray) return Geometry.Hit is
hit : Geometry.Hit;
hit_cpp : HitCpp;
hitRes : Interfaces.C.char;
begin
hitRes := gcore_closest_hit(r.origin.x'Address, r.direction.x'Address, 0.0, 100000.0,
hit_cpp'Address);
hit.is_hit := (hit_cpp.primIndex /= -1); --(hitRes /= 0);
hit.t := hit_cpp.t;
hit.normal.x := hit_cpp.normal(0);
hit.normal.y := hit_cpp.normal(1);
hit.normal.z := hit_cpp.normal(2);
hit.tx := hit_cpp.texCoord(0);
hit.ty := hit_cpp.texCoord(1);
hit.matId := -1;
return hit;
end Find_Closest_Hit;
end Scene;
|
reznikmm/matreshka | Ada | 4,616 | 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_Chart.Style_Name_Attributes is
------------
-- Create --
------------
overriding function Create
(Parameters : not null access Matreshka.DOM_Attributes.Attribute_L2_Parameters)
return Chart_Style_Name_Attribute_Node is
begin
return Self : Chart_Style_Name_Attribute_Node do
Matreshka.ODF_Chart.Constructors.Initialize
(Self'Unchecked_Access,
Parameters.Document,
Matreshka.ODF_String_Constants.Chart_Prefix);
end return;
end Create;
--------------------
-- Get_Local_Name --
--------------------
overriding function Get_Local_Name
(Self : not null access constant Chart_Style_Name_Attribute_Node)
return League.Strings.Universal_String
is
pragma Unreferenced (Self);
begin
return Matreshka.ODF_String_Constants.Style_Name_Attribute;
end Get_Local_Name;
begin
Matreshka.DOM_Documents.Register_Attribute
(Matreshka.ODF_String_Constants.Chart_URI,
Matreshka.ODF_String_Constants.Style_Name_Attribute,
Chart_Style_Name_Attribute_Node'Tag);
end Matreshka.ODF_Chart.Style_Name_Attributes;
|
charlie5/cBound | Ada | 1,231 | adb | with cLib.Binding;
with cLib.lconv;
with interfaces.C.Strings;
with ada.Strings.unbounded;
with ada.Text_IO;
procedure Simple
is
use ada.text_IO, ada.Strings.Unbounded, Interfaces.C.Strings;
the_set_Locale : Interfaces.C.Strings.chars_ptr := clib.Binding.setlocale (cLib.binding.LC_ALL,
new_String (""));
the_Locale : clib.lconv.Pointer := clib.Binding.localeconv.all'access;
function grouping_Image return String
is
the_Grouping : String := Value (the_Locale.grouping);
the_Image : unbounded_String;
begin
for Each in the_Grouping'range loop
append (the_Image, Integer'Image (Character'Pos (the_Grouping (Each))));
end loop;
return to_String (the_Image);
end grouping_Image;
begin
put_Line ("Locale is: '" & Value (the_set_Locale) & "'");
put_Line (" decimal_point: " & Value (the_Locale.decimal_Point ));
put_Line (" thousands_sep: " & Value (the_Locale.thousands_sep ));
put_Line (" grouping: " & grouping_Image );
put_Line (" int_curr_symbol: " & Value (the_Locale.int_curr_symbol));
end Simple;
|
stcarrez/ada-ado | Ada | 5,291 | ads | -----------------------------------------------------------------------
-- ado-connections-mysql -- MySQL Database connections
-- Copyright (C) 2009, 2010, 2017, 2019, 2022 Stephane Carrez
-- Written by Stephane Carrez ([email protected])
--
-- Licensed under the Apache License, Version 2.0 (the "License");
-- you may not use this file except in compliance with the License.
-- You may obtain a copy of the License at
--
-- http://www.apache.org/licenses/LICENSE-2.0
--
-- Unless required by applicable law or agreed to in writing, software
-- distributed under the License is distributed on an "AS IS" BASIS,
-- WITHOUT WARRANTIES OR CONDITIONS OF ANY KIND, either express or implied.
-- See the License for the specific language governing permissions and
-- limitations under the License.
-----------------------------------------------------------------------
with Mysql.Mysql; use Mysql.Mysql;
private with Ada.Strings.Unbounded;
package ADO.Connections.Mysql is
type Mysql_Driver is limited private;
-- Initialize the Mysql driver.
procedure Initialize;
private
use Ada.Strings.Unbounded;
-- Create a new MySQL connection using the configuration parameters.
procedure Create_Connection (D : in out Mysql_Driver;
Config : in Configuration'Class;
Result : in out Ref.Ref'Class);
type Mysql_Driver is new ADO.Connections.Driver with record
Id : Natural := 0;
end record;
-- Create the database and initialize it with the schema SQL file.
-- The `Admin` parameter describes the database connection with administrator access.
-- The `Config` parameter describes the target database connection.
overriding
procedure Create_Database (D : in out Mysql_Driver;
Admin : in Configs.Configuration'Class;
Config : in Configs.Configuration'Class;
Schema_Path : in String;
Messages : out Util.Strings.Vectors.Vector);
-- Deletes the Mysql driver.
overriding
procedure Finalize (D : in out Mysql_Driver);
-- Database connection implementation
type Database_Connection is new ADO.Connections.Database_Connection with record
Name : Unbounded_String := Null_Unbounded_String;
Server_Name : Unbounded_String := Null_Unbounded_String;
Login_Name : Unbounded_String := Null_Unbounded_String;
Password : Unbounded_String := Null_Unbounded_String;
Server : Mysql_Access := null;
Connected : Boolean := False;
-- MySQL autocommit flag
Autocommit : Boolean := True;
end record;
type Database_Connection_Access is access all Database_Connection'Class;
-- Get the database driver which manages this connection.
overriding
function Get_Driver (Database : in Database_Connection)
return Driver_Access;
overriding
function Create_Statement (Database : in Database_Connection;
Table : in ADO.Schemas.Class_Mapping_Access)
return Query_Statement_Access;
overriding
function Create_Statement (Database : in Database_Connection;
Query : in String)
return Query_Statement_Access;
-- Create a delete statement.
overriding
function Create_Statement (Database : in Database_Connection;
Table : in ADO.Schemas.Class_Mapping_Access)
return Delete_Statement_Access;
-- Create an insert statement.
overriding
function Create_Statement (Database : in Database_Connection;
Table : in ADO.Schemas.Class_Mapping_Access)
return Insert_Statement_Access;
-- Create an update statement.
overriding
function Create_Statement (Database : in Database_Connection;
Table : in ADO.Schemas.Class_Mapping_Access)
return Update_Statement_Access;
-- Start a transaction.
overriding
procedure Begin_Transaction (Database : in out Database_Connection);
-- Commit the current transaction.
overriding
procedure Commit (Database : in out Database_Connection);
-- Rollback the current transaction.
overriding
procedure Rollback (Database : in out Database_Connection);
procedure Execute (Database : in out Database_Connection;
SQL : in Query_String);
-- Closes the database connection
overriding
procedure Close (Database : in out Database_Connection);
overriding
procedure Finalize (Database : in out Database_Connection);
-- Load the database schema definition for the current database.
overriding
procedure Load_Schema (Database : in Database_Connection;
Schema : out ADO.Schemas.Schema_Definition);
-- Check if the table with the given name exists in the database.
overriding
function Has_Table (Database : in Database_Connection;
Name : in String) return Boolean;
end ADO.Connections.Mysql;
|
Arles96/PCompiladores | Ada | 220 | adb | procedure Numbers is
Mike, Alice: Integer;
John_Smith: Integer;
F: Float := 1.0;
procedure x2 (x3:Integer) is
x: Integer := 1;
begin
Mike := 1;
end x2;
begin
x2(Alice, 2, 3);
end Numbers; |
flyx/OpenGLAda | Ada | 1,650 | ads | -- part of OpenGLAda, (c) 2017 Felix Krause
-- released under the terms of the MIT license, see the file "COPYING"
generic
type Base (<>) is new Texture_Proxy with private;
package GL.Objects.Textures.With_3D_Loader is
pragma Preelaborate;
type Target is new Base with null record;
procedure Load_Empty_Texture
(Object : Target; Level : Mipmap_Level;
Internal_Format : Pixels.Internal_Format;
Width, Height, Depth : Types.Size);
procedure Storage (Object : Target;
Levels : Types.Size;
Internal_Format : Pixels.Internal_Format;
Width, Height, Depth : Types.Size);
type Fillable_Target is new Target with null record;
procedure Load_From_Data
(Object : Fillable_Target; Level : Mipmap_Level;
Internal_Format : Pixels.Internal_Format;
Width, Height, Depth : Types.Size;
Source_Format : Pixels.Data_Format;
Source_Type : Pixels.Data_Type;
Source : Image_Source);
procedure Load_Sub_Image_From_Data
(Object : Fillable_Target; Level : Mipmap_Level;
X_Offset, Y_Offset : Int;
Width, Height : Size;
Format : Pixels.Data_Format;
Data_Type : Pixels.Data_Type;
Source : Image_Source);
procedure Load_Compressed
(Object : Fillable_Target;
Level : Mipmap_Level;
Internal_Format : Pixels.Internal_Format;
Width, Height, Depth, Image_Size : Types.Size;
Source : Image_Source);
end GL.Objects.Textures.With_3D_Loader;
|
reznikmm/matreshka | Ada | 3,734 | 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.Table_Refresh_Delay_Attributes is
pragma Preelaborate;
type ODF_Table_Refresh_Delay_Attribute is limited interface
and XML.DOM.Attributes.DOM_Attribute;
type ODF_Table_Refresh_Delay_Attribute_Access is
access all ODF_Table_Refresh_Delay_Attribute'Class
with Storage_Size => 0;
end ODF.DOM.Table_Refresh_Delay_Attributes;
|
AdaDoom3/wayland_ada_binding | Ada | 4,648 | adb | ------------------------------------------------------------------------------
-- Copyright (C) 2015-2016, AdaCore --
-- --
-- This library is free software; you can redistribute it and/or modify it --
-- under terms of the GNU General Public License as published by the Free --
-- Software Foundation; either version 3, or (at your option) any later --
-- version. This library is distributed in the hope that it will be useful, --
-- but WITHOUT ANY WARRANTY; without even the implied warranty of MERCHAN- --
-- TABILITY 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/>. --
-- --
------------------------------------------------------------------------------
pragma Ada_2012;
package body Conts.Lists.Storage.Bounded_Definite with SPARK_Mode => Off is
package body Impl is
--------------
-- Allocate --
--------------
procedure Allocate
(Self : in out Container'Class;
Element : Stored_Type;
N : out Node_Access)
is
begin
if Self.Free > 0 then
N := Node_Access (Self.Free);
Self.Free := Integer (Self.Nodes (Count_Type (N)).Next);
else
N := Node_Access (abs Self.Free + 1);
Self.Free := Self.Free - 1;
end if;
if Count_Type (N) <= Self.Nodes'Last then
Self.Nodes (Count_Type (N)) :=
(Element => Element,
Previous => Null_Node_Access,
Next => Null_Node_Access);
else
N := Null_Node_Access;
end if;
end Allocate;
-----------------
-- Get_Element --
-----------------
function Get_Element
(Self : Container'Class; N : Node_Access) return Stored_Type is
begin
return Self.Nodes (Count_Type (N)).Element;
end Get_Element;
--------------
-- Get_Next --
--------------
function Get_Next
(Self : Container'Class; N : Node_Access) return Node_Access is
begin
return Self.Nodes (Count_Type (N)).Next;
end Get_Next;
------------------
-- Get_Previous --
------------------
function Get_Previous
(Self : Container'Class; N : Node_Access) return Node_Access is
begin
return Self.Nodes (Count_Type (N)).Previous;
end Get_Previous;
------------------
-- Set_Previous --
------------------
procedure Set_Previous
(Self : in out Container'Class; N, Prev : Node_Access) is
begin
Self.Nodes (Count_Type (N)).Previous := Prev;
end Set_Previous;
--------------
-- Set_Next --
--------------
procedure Set_Next
(Self : in out Container'Class; N, Next : Node_Access) is
begin
Self.Nodes (Count_Type (N)).Next := Next;
end Set_Next;
-----------------
-- Set_Element --
-----------------
procedure Set_Element
(Self : in out Impl.Container'Class;
N : Node_Access;
E : Stored_Type) is
begin
Self.Nodes (Count_Type (N)).Element := E;
end Set_Element;
------------
-- Assign --
------------
procedure Assign
(Nodes : in out Container'Class;
Source : Container'Class;
New_Head : out Node_Access;
Old_Head : Node_Access;
New_Tail : out Node_Access;
Old_Tail : Node_Access) is
begin
-- Indices will remain the same
New_Head := Old_Head;
New_Tail := Old_Tail;
Nodes.Free := Source.Free;
Nodes.Nodes := Source.Nodes;
end Assign;
end Impl;
end Conts.Lists.Storage.Bounded_Definite;
|
faelys/ada-syslog | Ada | 3,108 | adb | ------------------------------------------------------------------------------
-- Copyright (c) 2014, 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. --
------------------------------------------------------------------------------
package body Syslog.Transport.Send_Task is
procedure Set_Backend (Send : in Transporter) is
begin
Backend := Send;
end Set_Backend;
procedure Local_Transport (Message : in String) is
Send : constant Transporter := Backend;
begin
if Send /= null then
Queue.Append
(Ada.Strings.Unbounded.To_Unbounded_String (Message),
Send);
end if;
end Local_Transport;
protected body Queue is
entry Append
(Message : in Ada.Strings.Unbounded.Unbounded_String;
Send : in not null Transporter)
when True is
begin
if Task_Waiting then
Task_Waiting := False;
requeue Sender.Send;
else
List.Append (Message);
end if;
end Append;
procedure Get
(Message : out Ada.Strings.Unbounded.Unbounded_String;
Send : out Transporter) is
begin
if List.Is_Empty then
Send := null;
else
Message := List.First_Element;
Send := Backend;
List.Delete_First;
end if;
Task_Waiting := Send = null;
end Get;
end Queue;
task body Sender is
Packet : Ada.Strings.Unbounded.Unbounded_String;
Local_Backend : Transporter;
begin
loop
Queue.Get (Packet, Local_Backend);
if Local_Backend = null then
select
accept Send
(Message : in Ada.Strings.Unbounded.Unbounded_String;
Transport : in not null Transporter)
do
Packet := Message;
Local_Backend := Transport;
end Send;
or
terminate;
end select;
end if;
Local_Backend (Ada.Strings.Unbounded.To_String (Packet));
end loop;
end Sender;
end Syslog.Transport.Send_Task;
|
AdaCore/training_material | Ada | 50 | adb | package body Solar_System is
end Solar_System;
|
reznikmm/matreshka | Ada | 5,328 | 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.Generic_Collections;
package AMF.UML.Component_Realizations.Collections is
pragma Preelaborate;
package UML_Component_Realization_Collections is
new AMF.Generic_Collections
(UML_Component_Realization,
UML_Component_Realization_Access);
type Set_Of_UML_Component_Realization is
new UML_Component_Realization_Collections.Set with null record;
Empty_Set_Of_UML_Component_Realization : constant Set_Of_UML_Component_Realization;
type Ordered_Set_Of_UML_Component_Realization is
new UML_Component_Realization_Collections.Ordered_Set with null record;
Empty_Ordered_Set_Of_UML_Component_Realization : constant Ordered_Set_Of_UML_Component_Realization;
type Bag_Of_UML_Component_Realization is
new UML_Component_Realization_Collections.Bag with null record;
Empty_Bag_Of_UML_Component_Realization : constant Bag_Of_UML_Component_Realization;
type Sequence_Of_UML_Component_Realization is
new UML_Component_Realization_Collections.Sequence with null record;
Empty_Sequence_Of_UML_Component_Realization : constant Sequence_Of_UML_Component_Realization;
private
Empty_Set_Of_UML_Component_Realization : constant Set_Of_UML_Component_Realization
:= (UML_Component_Realization_Collections.Set with null record);
Empty_Ordered_Set_Of_UML_Component_Realization : constant Ordered_Set_Of_UML_Component_Realization
:= (UML_Component_Realization_Collections.Ordered_Set with null record);
Empty_Bag_Of_UML_Component_Realization : constant Bag_Of_UML_Component_Realization
:= (UML_Component_Realization_Collections.Bag with null record);
Empty_Sequence_Of_UML_Component_Realization : constant Sequence_Of_UML_Component_Realization
:= (UML_Component_Realization_Collections.Sequence with null record);
end AMF.UML.Component_Realizations.Collections;
|
AdaCore/libadalang | Ada | 63 | ads | with P1;
use P1;
package P2 is
R : P1.Record_Type;
end P2;
|
reznikmm/matreshka | Ada | 3,684 | 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.Style_Page_Layout_Elements is
pragma Preelaborate;
type ODF_Style_Page_Layout is limited interface
and XML.DOM.Elements.DOM_Element;
type ODF_Style_Page_Layout_Access is
access all ODF_Style_Page_Layout'Class
with Storage_Size => 0;
end ODF.DOM.Style_Page_Layout_Elements;
|
Fabien-Chouteau/GESTE | Ada | 6,443 | adb | with GESTE;
with GESTE.Tile_Bank;
with GESTE.Sprite.Rotated;
with GESTE_Config; use GESTE_Config;
with GESTE.Maths; use GESTE.Maths;
with GESTE.Physics;
with GESTE.Text;
with GESTE_Fonts.FreeMono6pt7b;
with Game_Assets.track_1;
with Game_Assets.Tileset;
with Interfaces; use Interfaces;
package body Player is
type Player_Type (Bank : not null GESTE.Tile_Bank.Const_Ref;
Init_Frame : GESTE_Config.Tile_Index)
is limited new GESTE.Physics.Object with record
Sprite : aliased GESTE.Sprite.Rotated.Instance (Bank, Init_Frame);
end record;
Tile_Bank : aliased GESTE.Tile_Bank.Instance
(Game_Assets.Tileset.Tiles'Access,
GESTE.No_Collisions,
Game_Assets.Palette'Access);
subtype Stat_Text is GESTE.Text.Instance
(Da_Font => GESTE_Fonts.FreeMono6pt7b.Font,
Number_Of_Columns => 15,
Number_Of_Lines => 1,
Foreground => 1,
Background => GESTE_Config.Transparent);
Next_Gate_Text : aliased Stat_Text;
Lap_Text : aliased Stat_Text;
Best_Text : aliased Stat_Text;
Current_Text : aliased Stat_Text;
Frame_Count : Unsigned_32 := 0;
Start : Game_Assets.Object renames
Game_Assets.track_1.Start.Objects (Game_Assets.track_1.Start.Objects'First);
P : aliased Player_Type (Tile_Bank'Access, 105);
Next_Gate : Natural := Game_Assets.track_1.gates.Objects'First;
Laps_Cnt : Natural := 0;
Best_Lap : Value := 0.0;
Current_Lap : Value := 0.0;
Do_Throttle : Boolean := False;
Do_Brake : Boolean := False;
Going_Left : Boolean := False;
Going_Right : Boolean := False;
function Inside_Gate (Obj : Game_Assets.Object) return Boolean;
-----------------
-- Inside_Gate --
-----------------
function Inside_Gate (Obj : Game_Assets.Object) return Boolean
is (P.Position.X in Obj.X .. Obj.X + Obj.Width
and then
P.Position.Y in Obj.Y .. Obj.Y + Obj.Height);
----------
-- Move --
----------
procedure Move (Pt : GESTE.Pix_Point) is
begin
P.Set_Position ((Value (Pt.X), Value (Pt.Y)));
end Move;
--------------
-- Position --
--------------
function Position return GESTE.Pix_Point
is ((Integer (P.Position.X), Integer (P.Position.Y)));
------------
-- Update --
------------
procedure Update (Elapsed : Value) is
Old : constant Point := P.Position;
Brake_Coef : Value;
Dir : constant Vect := P.Direction;
Traction : constant Vect := Dir * 10_000.0;
C_Drag : constant Value := 0.5 * 0.3 * 2.2 * 1.29;
VX : constant Value := P.Speed.X;
VY : constant Value := P.Speed.Y;
function Drag return Vect;
function Friction return Vect;
----------
-- Drag --
----------
function Drag return Vect is
Speed : constant Value := Magnitude (P.Speed);
begin
return (-(Value (C_Drag * VX) * Speed),
-(Value (C_Drag * VY) * Speed));
end Drag;
--------------
-- Friction --
--------------
function Friction return Vect is
C_TT : Value := 30.0 * C_Drag;
begin
if not GESTE.Collides ((Integer (Old.X), Integer (Old.Y))) then
-- Off track
C_TT := C_TT * 100;
end if;
return (-C_TT * VX, -C_TT * VY);
end Friction;
begin
Frame_Count := Frame_Count + 1;
if Going_Right then
P.Set_Angle (P.Angle - 0.060);
end if;
if Going_Left then
P.Set_Angle (P.Angle + 0.060);
end if;
if Do_Throttle then
P.Apply_Force (Traction);
end if;
if Do_Brake then
Brake_Coef := -120.0;
else
Brake_Coef := -90.0;
end if;
P.Apply_Force ((P.Speed.X * Brake_Coef, P.Speed.Y * Brake_Coef));
P.Apply_Force (Drag);
P.Apply_Force (Friction);
P.Step (Elapsed);
P.Set_Angle (P.Angle);
P.Sprite.Move ((Integer (P.Position.X) - 8,
Integer (P.Position.Y) - 8));
P.Sprite.Angle (P.Angle);
if Frame_Count mod 10 = 0 then
-- Update the current time every 10 frames
Current_Text.Clear;
Current_Text.Cursor (1, 1);
Current_Text.Put (Current_Lap'Img);
end if;
Current_Lap := Current_Lap + Elapsed;
if Inside_Gate (Game_Assets.track_1.gates.Objects (Next_Gate)) then
if Next_Gate = Game_Assets.track_1.gates.Objects'Last then
Next_Gate := Game_Assets.track_1.gates.Objects'First;
Laps_Cnt := Laps_Cnt + 1;
Lap_Text.Clear;
Lap_Text.Cursor (1, 1);
Lap_Text.Put ("Lap:" & Laps_Cnt'Img);
if Best_Lap = 0.0 or else Current_Lap < Best_Lap then
Best_Lap := Current_Lap;
Best_Text.Clear;
Best_Text.Cursor (1, 1);
Best_Text.Put ("Best:" & Best_Lap'Img);
end if;
Current_Lap := 0.0;
else
Next_Gate := Next_Gate + 1;
end if;
Next_Gate_Text.Clear;
Next_Gate_Text.Cursor (1, 1);
Next_Gate_Text.Put ("Next Gate:" & Next_Gate'Img);
end if;
Do_Throttle := False;
Do_Brake := False;
Going_Left := False;
Going_Right := False;
end Update;
--------------
-- Throttle --
--------------
procedure Throttle is
begin
Do_Throttle := True;
end Throttle;
-----------
-- Brake --
-----------
procedure Brake is
begin
Do_Brake := True;
end Brake;
---------------
-- Move_Left --
---------------
procedure Move_Left is
begin
Going_Left := True;
end Move_Left;
----------------
-- Move_Right --
----------------
procedure Move_Right is
begin
Going_Right := True;
end Move_Right;
begin
P.Set_Position ((Value (Start.X), Value (Start.Y)));
P.Set_Angle (Pi);
P.Set_Mass (90.0);
GESTE.Add (P.Sprite'Access, 3);
Next_Gate_Text.Move ((220, 0));
Next_Gate_Text.Put ("Next Gate: 0");
GESTE.Add (Next_Gate_Text'Access, 4);
Lap_Text.Move ((220, 10));
Lap_Text.Put ("Lap: 0");
GESTE.Add (Lap_Text'Access, 5);
Best_Text.Move ((220, 20));
Best_Text.Put ("Best: 0.0");
GESTE.Add (Best_Text'Access, 6);
Current_Text.Move ((260, 30));
GESTE.Add (Current_Text'Access, 7);
end Player;
|
AdaCore/libadalang | Ada | 2,930 | adb | procedure Geni is
generic
type T is private;
procedure P1 (A : T);
generic
type T1 is private;
type T2 is private;
procedure P2 (A : T1; B : T1; C : T2);
generic
type T is private;
X, Y : T;
procedure P4 (A : T);
generic
type T is private;
X, Y : T;
M : Integer := 0;
N : Integer := 0;
procedure P5 (A : T);
generic
type T is private;
X, Y: T;
M, N : Integer := 0;
procedure P6 (A : T);
procedure P1 (A : T) is null;
procedure P2 (A : T1; B : T1; C : T2) is null;
procedure P4 (A : T) is null;
procedure P5 (A : T) is null;
procedure P6 (A : T) is null;
procedure I1P1 is new P1 (Integer);
--% node.p_inst_params
procedure I2P1 is new P1 (T => Integer);
--% node.p_inst_params
procedure I1P2 is new P2 (Integer, Float);
--% node.p_inst_params
procedure I2P2 is new P2 (T2 => Integer, T1 => Float);
--% node.p_inst_params
procedure I1P4 is new P4 (Integer, 0, 1);
--% node.p_inst_params
procedure I2P4 is new P4 (X => 0, Y => 0, T => Integer);
--% node.p_inst_params
procedure I3P4 is new P4 (Integer, Y => 0, X => 0);
--% node.p_inst_params
procedure I1P5 is new P5 (Integer, 0, 1, 2, 3);
--% node.p_inst_params
procedure I2P5 is new P5 (Integer, 0, 1, N => 2, M => 3);
--% node.p_inst_params
procedure I3P5 is new P5 (Integer, Y => 0, M => 1, N => 2, X => 3);
--% node.p_inst_params
procedure I4P5 is new P5 (Y => 0, M => 1, N => 2, X => 3, T => Integer);
--% node.p_inst_params
procedure I5P5 is new P5 (Integer, Y => 0, X => 3);
--% node.p_inst_params
procedure I6P5 is new P5 (Integer, Y => 0, M => 0, X => 3);
--% node.p_inst_params
procedure I1P6 is new P6 (Integer, 0, 1, 2, 3);
--% node.p_inst_params
procedure I2P6 is new P6 (Integer, 0, 1, N => 2, M => 3);
--% node.p_inst_params
procedure I3P6 is new P6 (Integer, Y => 0, M => 1, N => 2, X => 3);
--% node.p_inst_params
procedure I4P6 is new P6 (Y => 0, M => 1, N => 2, X => 3, T => Integer);
--% node.p_inst_params
procedure I5P6 is new P6 (Integer, Y => 0, X => 3);
--% node.p_inst_params
procedure I6P6 is new P6 (Integer, Y => 0, M => 0, X => 3);
--% node.p_inst_params
generic
type T is private;
X : Integer := 0;
Y, Z : Integer := 1;
M : Integer;
package PA is
procedure P1 (A : T);
private
procedure P1 (A : T) is null;
end PA;
package I1PA is new PA (Integer, M => 0);
--% node.p_inst_params
package I2PA is new PA (T => Integer, M => 8);
--% node.p_inst_params
package I3PA is new PA (Integer, 0, 0, 0, 0);
--% node.p_inst_params
package I4PA is new PA (Integer, Z => 0, X => 0, Y => 0, M => 0);
--% node.p_inst_params
package I5PA is new PA (X => 0, Y => 0, Z => 0, T => Integer, M => 0);
--% node.p_inst_params
begin
null;
end Geni;
|
joakim-strandberg/wayland_ada_binding | Ada | 135,997 | adb | with System.Address_To_Access_Conversions;
package body C_Binding.Linux.Wayland_Client is
use type int;
-- Mostly auto generated from Wayland.xml
package body Wl_Thin is
procedure wl_proxy_destroy (Registry : Proxy_Ptr) with
Convention => C,
Import => True,
External_Name => "wl_proxy_destroy";
function Display_Connect (Name : C_String) return Display_Ptr is
function Wl_Display_Connect
(Name : in C_String) return Display_Ptr with
Convention => C,
Import => True,
External_Name => "wl_display_connect";
begin
return wl_display_connect (Name);
end Display_Connect;
procedure Display_Disconnect (This : in out Display_Ptr) is
procedure wl_display_disconnect (Display : Display_Ptr) with
Convention => C,
Import => True;
begin
if This /= null then
wl_display_disconnect (This);
This := null;
end if;
end Display_Disconnect;
function wl_proxy_add_listener
(arg1 : Proxy_Ptr;
arg2 : Void_Ptr;
arg3 : Void_Ptr) return Interfaces.C.int with
Import => True,
Convention => C,
External_Name => "wl_proxy_add_listener";
-- Returns 0 on success, otherwise -1 on failure.
procedure wl_proxy_set_user_data
(arg1 : Proxy_Ptr;
arg3 : Void_Ptr) with
Import => True,
Convention => C,
External_Name => "wl_proxy_set_user_data";
function wl_proxy_get_user_data
(arg1 : Proxy_Ptr) return Void_Ptr with
Import => True,
Convention => C,
External_Name => "wl_proxy_get_user_data";
function wl_proxy_get_version
(arg1 : Proxy_Ptr) return Unsigned_32 with
Import => True,
Convention => C,
External_Name => "wl_proxy_get_version";
function Display_Add_Listener
(Display : Display_Ptr;
Listener : Display_Listener_Ptr;
Data : Void_Ptr) return Interfaces.C.Int is
begin
return Wl_Proxy_Add_Listener
(Display.all'Access, Listener.all'Address, Data);
end Display_Add_Listener;
procedure Display_Set_User_Data
(Display : Display_Ptr;
Data : Void_Ptr) is
begin
wl_proxy_set_user_data (Display.all'Access, Data);
end Display_Set_User_Data;
function Display_Get_User_Data
(Display : Display_Ptr) return Void_Ptr is
begin
return wl_proxy_get_user_data (Display.all'Access);
end Display_Get_User_Data;
function Display_Get_Version
(Display : Display_Ptr) return Unsigned_32 is
begin
return wl_proxy_get_version (Display.all'Access);
end Display_Get_Version;
procedure Display_Destroy (Display : Display_Ptr) is
begin
wl_proxy_destroy (Display.all'Access);
end Display_Destroy;
function Display_Sync (Display : Display_Ptr) return Callback_Ptr is
P : constant Proxy_Ptr
:= Proxy_Marshal_Constructor
(Display.all'Access,
WL_DISPLAY_SYNC,
Callback_Interface'Access,
0);
begin
return (if P /= null then P.all'Access else null);
end Display_Sync;
function Display_Get_Registry
(Display : Display_Ptr) return Registry_Ptr
is
P : constant Proxy_Ptr
:= Proxy_Marshal_Constructor (Display.all'Access,
WL_DISPLAY_GET_REGISTRY,
Registry_Interface'Access,
0);
begin
return (if P /= null then P.all'Access else null);
end Display_Get_Registry;
function Registry_Add_Listener
(Registry : Registry_Ptr;
Listener : Registry_Listener_Ptr;
Data : Void_Ptr) return Interfaces.C.Int is
begin
return Wl_Proxy_Add_Listener
(Registry.all'Access, Listener.all'Address, Data);
end Registry_Add_Listener;
procedure Registry_Set_User_Data (Registry : Registry_Ptr;
Data : Void_Ptr) is
begin
wl_proxy_set_user_data (Registry.all'Access, Data);
end Registry_Set_User_Data;
function Registry_Get_User_Data
(Registry : Registry_Ptr) return Void_Ptr is
begin
return wl_proxy_get_user_data (Registry.all'Access);
end Registry_Get_User_Data;
function Registry_Get_Version
(Registry : Registry_Ptr) return Unsigned_32 is
begin
return wl_proxy_get_version (Registry.all'Access);
end Registry_Get_Version;
procedure Registry_Destroy (Registry : Registry_Ptr) is
begin
wl_proxy_destroy (Registry.all'Access);
end Registry_Destroy;
function Registry_Bind (Registry : Registry_Ptr;
Name : Unsigned_32;
Interface_V : Interface_Ptr;
New_Id : Unsigned_32) return Proxy_Ptr is
begin
return Proxy_Marshal_Constructor_Versioned (Registry.all'Access,
WL_REGISTRY_BIND,
Interface_V,
New_Id,
Name,
Interface_V.Name,
New_Id,
0);
end Registry_Bind;
function Callback_Add_Listener
(Callback : Callback_Ptr;
Listener : Callback_Listener_Ptr;
Data : Void_Ptr) return Interfaces.C.Int is
begin
return Wl_Proxy_Add_Listener
(Callback.all'Access, Listener.all'Address, Data);
end Callback_Add_Listener;
procedure Callback_Set_User_Data
(Callback : Callback_Ptr;
Data : Void_Ptr) is
begin
wl_proxy_set_user_data (Callback.all'Access, Data);
end Callback_Set_User_Data;
function Callback_Get_User_Data
(Callback : Callback_Ptr) return Void_Ptr is
begin
return wl_proxy_get_user_data (Callback.all'Access);
end Callback_Get_User_Data;
function Callback_Get_Version
(Callback : Callback_Ptr) return Unsigned_32 is
begin
return wl_proxy_get_version (Callback.all'Access);
end Callback_Get_Version;
procedure Callback_Destroy (Callback : Callback_Ptr) is
begin
wl_proxy_destroy (Callback.all'Access);
end Callback_Destroy;
procedure Compositor_Set_User_Data
(Compositor : Compositor_Ptr;
Data : Void_Ptr) is
begin
wl_proxy_set_user_data (Compositor.all'Access, Data);
end Compositor_Set_User_Data;
function Compositor_Get_User_Data
(Compositor : Compositor_Ptr) return Void_Ptr is
begin
return wl_proxy_get_user_data (Compositor.all'Access);
end Compositor_Get_User_Data;
function Compositor_Get_Version
(Compositor : Compositor_Ptr) return Unsigned_32 is
begin
return wl_proxy_get_version (Compositor.all'Access);
end Compositor_Get_Version;
procedure Compositor_Destroy (Compositor : Compositor_Ptr) is
begin
wl_proxy_destroy (Compositor.all'Access);
end Compositor_Destroy;
function Compositor_Create_Surface
(Compositor : Compositor_Ptr) return Surface_Ptr
is
P : constant Proxy_Ptr
:= Proxy_Marshal_Constructor (Compositor.all'Access,
WL_COMPOSITOR_CREATE_SURFACE,
Surface_Interface'Access,
0);
begin
return (if P /= null then P.all'Access else null);
end Compositor_Create_Surface;
function Compositor_Create_Region
(Compositor : Compositor_Ptr) return Region_Ptr
is
P : constant Proxy_Ptr
:= Proxy_Marshal_Constructor (Compositor.all'Access,
WL_COMPOSITOR_CREATE_REGION,
Region_Interface'Access,
0);
begin
return (if P /= null then P.all'Access else null);
end Compositor_Create_Region;
procedure Shm_Pool_Set_User_Data (Shm_Pool : Shm_Pool_Ptr;
Data : Void_Ptr) is
begin
wl_proxy_set_user_data (Shm_Pool.all'Access, Data);
end Shm_Pool_Set_User_Data;
function Shm_Pool_Get_User_Data
(Shm_Pool : Shm_Pool_Ptr) return Void_Ptr is
begin
return wl_proxy_get_user_data (Shm_Pool.all'Access);
end Shm_Pool_Get_User_Data;
function Shm_Pool_Get_Version
(Shm_Pool : Shm_Pool_Ptr) return Unsigned_32 is
begin
return wl_proxy_get_version (Shm_Pool.all'Access);
end Shm_Pool_Get_Version;
procedure Shm_Pool_Destroy (Shm_Pool : Shm_Pool_Ptr) is
begin
Proxy_Marshal (Proxy_Ptr'(Shm_Pool.all'Access),
WL_SHM_POOL_DESTROY);
wl_proxy_destroy (Shm_Pool.all'Access);
end Shm_Pool_Destroy;
function Shm_Pool_Create_Buffer
(Shm_Pool : Shm_Pool_Ptr;
Offset : Integer;
Width : Integer;
Height : Integer;
Stride : Integer;
Format : Unsigned_32
) return Buffer_Ptr
is
P : constant Proxy_Ptr
:= Proxy_Marshal_Constructor (Shm_Pool.all'Access,
WL_SHM_POOL_CREATE_BUFFER,
Buffer_Interface'Access,
0,
Offset,
Width,
Height,
Stride,
Format);
begin
return (if P /= null then P.all'Access else null);
end Shm_Pool_Create_Buffer;
procedure Shm_Pool_Resize (Shm_Pool : Shm_Pool_Ptr;
Size : Integer
) is
begin
Proxy_Marshal (Proxy_Ptr'(Shm_Pool.all'Access),
WL_SHM_POOL_RESIZE,
Size );
end Shm_Pool_Resize;
function Shm_Add_Listener
(Shm : Shm_Ptr;
Listener : Shm_Listener_Ptr;
Data : Void_Ptr) return Interfaces.C.Int is
begin
return Wl_Proxy_Add_Listener
(Shm.all'Access, Listener.all'Address, Data);
end Shm_Add_Listener;
procedure Shm_Set_User_Data (Shm : Shm_Ptr;
Data : Void_Ptr) is
begin
wl_proxy_set_user_data (Shm.all'Access, Data);
end Shm_Set_User_Data;
function Shm_Get_User_Data (Shm : Shm_Ptr) return Void_Ptr is
begin
return wl_proxy_get_user_data (Shm.all'Access);
end Shm_Get_User_Data;
function Shm_Get_Version (Shm : Shm_Ptr) return Unsigned_32 is
begin
return wl_proxy_get_version (Shm.all'Access);
end Shm_Get_Version;
procedure Shm_Destroy (Shm : Shm_Ptr) is
begin
wl_proxy_destroy (Shm.all'Access);
end Shm_Destroy;
function Shm_Create_Pool (Shm : Shm_Ptr;
Fd : Integer;
Size : Integer
) return Shm_Pool_Ptr is
P : constant Proxy_Ptr
:= Proxy_Marshal_Constructor (Shm.all'Access,
WL_SHM_CREATE_POOL,
Shm_Pool_Interface'Access,
0,
Fd,
Size);
begin
return (if P /= null then P.all'Access else null);
end Shm_Create_Pool;
function Buffer_Add_Listener
(Buffer : Buffer_Ptr;
Listener : Buffer_Listener_Ptr;
Data : Void_Ptr) return Interfaces.C.Int is
begin
return Wl_Proxy_Add_Listener
(Buffer.all'Access, Listener.all'Address, Data);
end Buffer_Add_Listener;
procedure Buffer_Set_User_Data (Buffer : Buffer_Ptr;
Data : Void_Ptr) is
begin
wl_proxy_set_user_data (Buffer.all'Access, Data);
end Buffer_Set_User_Data;
function Buffer_Get_User_Data (Buffer : Buffer_Ptr) return Void_Ptr is
begin
return wl_proxy_get_user_data (Buffer.all'Access);
end Buffer_Get_User_Data;
function Buffer_Get_Version (Buffer : Buffer_Ptr) return Unsigned_32 is
begin
return wl_proxy_get_version (Buffer.all'Access);
end Buffer_Get_Version;
procedure Buffer_Destroy (Buffer : Buffer_Ptr) is
begin
Proxy_Marshal (Proxy_Ptr'(Buffer.all'Access),
WL_BUFFER_DESTROY);
wl_proxy_destroy (Buffer.all'Access);
end Buffer_Destroy;
function Data_Offer_Add_Listener
(Data_Offer : Data_Offer_Ptr;
Listener : Data_Offer_Listener_Ptr;
Data : Void_Ptr) return Interfaces.C.Int is
begin
return Wl_Proxy_Add_Listener
(Data_Offer.all'Access, Listener.all'Address, Data);
end Data_Offer_Add_Listener;
procedure Data_Offer_Set_User_Data
(Data_Offer : Data_Offer_Ptr;
Data : Void_Ptr) is
begin
wl_proxy_set_user_data (Data_Offer.all'Access, Data);
end Data_Offer_Set_User_Data;
function Data_Offer_Get_User_Data
(Data_Offer : Data_Offer_Ptr) return Void_Ptr is
begin
return wl_proxy_get_user_data (Data_Offer.all'Access);
end Data_Offer_Get_User_Data;
function Data_Offer_Get_Version
(Data_Offer : Data_Offer_Ptr) return Unsigned_32 is
begin
return wl_proxy_get_version (Data_Offer.all'Access);
end Data_Offer_Get_Version;
procedure Data_Offer_Destroy (Data_Offer : Data_Offer_Ptr) is
begin
Proxy_Marshal (Proxy_Ptr'(Data_Offer.all'Access),
WL_DATA_OFFER_DESTROY);
wl_proxy_destroy (Data_Offer.all'Access);
end Data_Offer_Destroy;
procedure Data_Offer_Accept (Data_Offer : Data_Offer_Ptr;
Serial : Unsigned_32;
Mime_Type : chars_ptr
) is
begin
Proxy_Marshal (Proxy_Ptr'(Data_Offer.all'Access),
WL_DATA_OFFER_ACCEPT,
Serial,
Mime_Type );
end Data_Offer_Accept;
procedure Data_Offer_Receive (Data_Offer : Data_Offer_Ptr;
Mime_Type : C_String;
Fd : Integer
) is
begin
Proxy_Marshal (Proxy_Ptr'(Data_Offer.all'Access),
WL_DATA_OFFER_RECEIVE,
Mime_Type,
Fd );
end Data_Offer_Receive;
procedure Data_Offer_Finish (Data_Offer : Data_Offer_Ptr) is
begin
Proxy_Marshal
(Proxy_Ptr'(Data_Offer.all'Access), WL_DATA_OFFER_FINISH);
end Data_Offer_Finish;
procedure Data_Offer_Set_Actions
(Data_Offer : Data_Offer_Ptr;
Dnd_Actions : Unsigned_32;
Preferred_Action : Unsigned_32) is
begin
Proxy_Marshal (Proxy_Ptr'(Data_Offer.all'Access),
WL_DATA_OFFER_SET_ACTIONS,
Dnd_Actions,
Preferred_Action );
end Data_Offer_Set_Actions;
function Data_Source_Add_Listener
(Data_Source : Data_Source_Ptr;
Listener : Data_Source_Listener_Ptr;
Data : Void_Ptr) return Interfaces.C.Int is
begin
return Wl_Proxy_Add_Listener
(Data_Source.all'Access, Listener.all'Address, Data);
end Data_Source_Add_Listener;
procedure Data_Source_Set_User_Data
(Data_Source : Data_Source_Ptr;
Data : Void_Ptr) is
begin
wl_proxy_set_user_data (Data_Source.all'Access, Data);
end Data_Source_Set_User_Data;
function Data_Source_Get_User_Data
(Data_Source : Data_Source_Ptr) return Void_Ptr is
begin
return wl_proxy_get_user_data (Data_Source.all'Access);
end Data_Source_Get_User_Data;
function Data_Source_Get_Version
(Data_Source : Data_Source_Ptr) return Unsigned_32 is
begin
return wl_proxy_get_version (Data_Source.all'Access);
end Data_Source_Get_Version;
procedure Data_Source_Destroy (Data_Source : Data_Source_Ptr) is
begin
Proxy_Marshal (Proxy_Ptr'(Data_Source.all'Access),
WL_DATA_SOURCE_DESTROY);
wl_proxy_destroy (Data_Source.all'Access);
end Data_Source_Destroy;
procedure Data_Source_Offer (Data_Source : Data_Source_Ptr;
Mime_Type : chars_ptr
) is
begin
Proxy_Marshal (Proxy_Ptr'(Data_Source.all'Access),
WL_DATA_SOURCE_OFFER,
Mime_Type );
end Data_Source_Offer;
procedure Data_Source_Set_Actions (Data_Source : Data_Source_Ptr;
Dnd_Actions : Unsigned_32
) is
begin
Proxy_Marshal (Proxy_Ptr'(Data_Source.all'Access),
WL_DATA_SOURCE_SET_ACTIONS,
Dnd_Actions );
end Data_Source_Set_Actions;
function Data_Device_Add_Listener
(Data_Device : Data_Device_Ptr;
Listener : Data_Device_Listener_Ptr;
Data : Void_Ptr) return Interfaces.C.Int is
begin
return Wl_Proxy_Add_Listener
(Data_Device.all'Access, Listener.all'Address, Data);
end Data_Device_Add_Listener;
procedure Data_Device_Set_User_Data
(Data_Device : Data_Device_Ptr;
Data : Void_Ptr) is
begin
wl_proxy_set_user_data (Data_Device.all'Access, Data);
end Data_Device_Set_User_Data;
function Data_Device_Get_User_Data
(Data_Device : Data_Device_Ptr) return Void_Ptr is
begin
return wl_proxy_get_user_data (Data_Device.all'Access);
end Data_Device_Get_User_Data;
function Data_Device_Get_Version
(Data_Device : Data_Device_Ptr) return Unsigned_32 is
begin
return wl_proxy_get_version (Data_Device.all'Access);
end Data_Device_Get_Version;
procedure Data_Device_Destroy (Data_Device : Data_Device_Ptr) is
begin
wl_proxy_destroy (Data_Device.all'Access);
end Data_Device_Destroy;
procedure Data_Device_Start_Drag
(Data_Device : Data_Device_Ptr;
Source : Data_Source_Ptr;
Origin : Surface_Ptr;
Icon : Surface_Ptr;
Serial : Unsigned_32) is
begin
Proxy_Marshal (Proxy_Ptr'(Data_Device.all'Access),
WL_DATA_DEVICE_START_DRAG,
Source.all'Address,
Origin.all'Address,
Icon.all'Address,
Serial );
end Data_Device_Start_Drag;
procedure Data_Device_Set_Selection
(Data_Device : Data_Device_Ptr;
Source : Data_Source_Ptr;
Serial : Unsigned_32) is
begin
Proxy_Marshal (Proxy_Ptr'(Data_Device.all'Access),
WL_DATA_DEVICE_SET_SELECTION,
Source.all'Address,
Serial );
end Data_Device_Set_Selection;
procedure Data_Device_Release (Data_Device : Data_Device_Ptr) is
begin
Proxy_Marshal
(Proxy_Ptr'(Data_Device.all'Access), WL_DATA_DEVICE_RELEASE);
end Data_Device_Release;
procedure Data_Device_Manager_Set_User_Data
(Data_Device_Manager : Data_Device_Manager_Ptr;
Data : Void_Ptr) is
begin
wl_proxy_set_user_data (Data_Device_Manager.all'Access, Data);
end Data_Device_Manager_Set_User_Data;
function Data_Device_Manager_Get_User_Data
(Data_Device_Manager : Data_Device_Manager_Ptr) return Void_Ptr is
begin
return wl_proxy_get_user_data (Data_Device_Manager.all'Access);
end Data_Device_Manager_Get_User_Data;
function Data_Device_Manager_Get_Version
(Data_Device_Manager : Data_Device_Manager_Ptr) return Unsigned_32 is
begin
return wl_proxy_get_version (Data_Device_Manager.all'Access);
end Data_Device_Manager_Get_Version;
procedure Data_Device_Manager_Destroy
(Data_Device_Manager : Data_Device_Manager_Ptr) is
begin
wl_proxy_destroy (Data_Device_Manager.all'Access);
end Data_Device_Manager_Destroy;
function Data_Device_Manager_Create_Data_Source
(
Data_Device_Manager : Data_Device_Manager_Ptr
) return Data_Source_Ptr
is
P : constant Proxy_Ptr
:= Proxy_Marshal_Constructor (Data_Device_Manager.all'Access,
WL_DATA_DEVICE_MANAGER_CREATE_DATA_SOURCE,
Data_Source_Interface'Access,
0);
begin
return (if P /= null then P.all'Access else null);
end Data_Device_Manager_Create_Data_Source;
function Data_Device_Manager_Get_Data_Device
(Data_Device_Manager : Data_Device_Manager_Ptr;
Seat : Seat_Ptr) return Data_Device_Ptr is
P : constant Proxy_Ptr
:= Proxy_Marshal_Constructor (Data_Device_Manager.all'Access,
WL_DATA_DEVICE_MANAGER_GET_DATA_DEVICE,
Data_Device_Interface'Access,
0,
Seat.all'Address);
begin
return (if P /= null then P.all'Access else null);
end Data_Device_Manager_Get_Data_Device;
procedure Shell_Set_User_Data (Shell : Shell_Ptr;
Data : Void_Ptr) is
begin
wl_proxy_set_user_data (Shell.all'Access, Data);
end Shell_Set_User_Data;
function Shell_Get_User_Data (Shell : Shell_Ptr) return Void_Ptr is
begin
return wl_proxy_get_user_data (Shell.all'Access);
end Shell_Get_User_Data;
function Shell_Get_Version (Shell : Shell_Ptr) return Unsigned_32 is
begin
return wl_proxy_get_version (Shell.all'Access);
end Shell_Get_Version;
procedure Shell_Destroy (Shell : Shell_Ptr) is
begin
wl_proxy_destroy (Shell.all'Access);
end Shell_Destroy;
function Shell_Get_Shell_Surface
(Shell : Shell_Ptr;
Surface : Surface_Ptr
) return Shell_Surface_Ptr
is
P : constant Proxy_Ptr
:= Proxy_Marshal_Constructor (Shell.all'Access,
WL_SHELL_GET_SHELL_SURFACE,
Shell_Surface_Interface'Access,
0,
Surface.all'Address);
begin
return (if P /= null then P.all'Access else null);
end Shell_Get_Shell_Surface;
function Shell_Surface_Add_Listener
(Shell_Surface : Shell_Surface_Ptr;
Listener : Shell_Surface_Listener_Ptr;
Data : Void_Ptr) return Interfaces.C.Int is
begin
return Wl_Proxy_Add_Listener
(Shell_Surface.all'Access, Listener.all'Address, Data);
end Shell_Surface_Add_Listener;
procedure Shell_Surface_Set_User_Data
(Shell_Surface : Shell_Surface_Ptr;
Data : Void_Ptr) is
begin
wl_proxy_set_user_data (Shell_Surface.all'Access, Data);
end Shell_Surface_Set_User_Data;
function Shell_Surface_Get_User_Data
(Shell_Surface : Shell_Surface_Ptr) return Void_Ptr is
begin
return wl_proxy_get_user_data (Shell_Surface.all'Access);
end Shell_Surface_Get_User_Data;
function Shell_Surface_Get_Version
(Shell_Surface : Shell_Surface_Ptr) return Unsigned_32 is
begin
return wl_proxy_get_version (Shell_Surface.all'Access);
end Shell_Surface_Get_Version;
procedure Shell_Surface_Destroy (Shell_Surface : Shell_Surface_Ptr) is
begin
wl_proxy_destroy (Shell_Surface.all'Access);
end Shell_Surface_Destroy;
procedure Shell_Surface_Pong (Shell_Surface : Shell_Surface_Ptr;
Serial : Unsigned_32
) is
begin
Proxy_Marshal (Proxy_Ptr'(Shell_Surface.all'Access),
WL_SHELL_SURFACE_PONG,
Serial );
end Shell_Surface_Pong;
procedure Shell_Surface_Move (Shell_Surface : Shell_Surface_Ptr;
Seat : Seat_Ptr;
Serial : Unsigned_32
) is
begin
Proxy_Marshal (Proxy_Ptr'(Shell_Surface.all'Access),
WL_SHELL_SURFACE_MOVE,
Seat.all'Address,
Serial );
end Shell_Surface_Move;
procedure Shell_Surface_Resize (Shell_Surface : Shell_Surface_Ptr;
Seat : Seat_Ptr;
Serial : Unsigned_32;
Edges : Unsigned_32
) is
begin
Proxy_Marshal (Proxy_Ptr'(Shell_Surface.all'Access),
WL_SHELL_SURFACE_RESIZE,
Seat.all'Address,
Serial,
Edges );
end Shell_Surface_Resize;
procedure Shell_Surface_Set_Toplevel
(Shell_Surface : Shell_Surface_Ptr) is
begin
Proxy_Marshal
(Proxy_Ptr'(Shell_Surface.all'Access),
WL_SHELL_SURFACE_SET_TOPLEVEL);
end Shell_Surface_Set_Toplevel;
procedure Shell_Surface_Set_Transient
(Shell_Surface : Shell_Surface_Ptr;
Parent : Surface_Ptr;
X : Integer;
Y : Integer;
Flags : Unsigned_32) is
begin
Proxy_Marshal (Proxy_Ptr'(Shell_Surface.all'Access),
WL_SHELL_SURFACE_SET_TRANSIENT,
Parent.all'Address,
X,
Y,
Flags );
end Shell_Surface_Set_Transient;
procedure Shell_Surface_Set_Fullscreen
(Shell_Surface : Shell_Surface_Ptr;
Method : Unsigned_32;
Framerate : Unsigned_32;
Output : Output_Ptr) is
begin
Proxy_Marshal (Proxy_Ptr'(Shell_Surface.all'Access),
WL_SHELL_SURFACE_SET_FULLSCREEN,
Method,
Framerate,
Output.all'Address);
end Shell_Surface_Set_Fullscreen;
procedure Shell_Surface_Set_Popup
(Shell_Surface : Shell_Surface_Ptr;
Seat : Seat_Ptr;
Serial : Unsigned_32;
Parent : Surface_Ptr;
X : Integer;
Y : Integer;
Flags : Unsigned_32) is
begin
Proxy_Marshal (Proxy_Ptr'(Shell_Surface.all'Access),
WL_SHELL_SURFACE_SET_POPUP,
Seat.all'Address,
Serial,
Parent.all'Address,
X,
Y,
Flags );
end Shell_Surface_Set_Popup;
procedure Shell_Surface_Set_Maximized
(Shell_Surface : Shell_Surface_Ptr;
Output : Output_Ptr) is
begin
Proxy_Marshal (Proxy_Ptr'(Shell_Surface.all'Access),
WL_SHELL_SURFACE_SET_MAXIMIZED,
Output.all'Address );
end Shell_Surface_Set_Maximized;
procedure Shell_Surface_Set_Title
(Shell_Surface : Shell_Surface_Ptr;
Title : Chars_Ptr) is
begin
Proxy_Marshal (Proxy_Ptr'(Shell_Surface.all'Access),
WL_SHELL_SURFACE_SET_TITLE,
Title );
end Shell_Surface_Set_Title;
procedure Shell_Surface_Set_Class
(Shell_Surface : Shell_Surface_Ptr;
Class_V : Chars_Ptr) is
begin
Proxy_Marshal (Proxy_Ptr'(Shell_Surface.all'Access),
WL_SHELL_SURFACE_SET_CLASS,
Class_V );
end Shell_Surface_Set_Class;
function Surface_Add_Listener
(Surface : Surface_Ptr;
Listener : Surface_Listener_Ptr;
Data : Void_Ptr) return Interfaces.C.Int is
begin
return Wl_Proxy_Add_Listener
(Surface.all'Access, Listener.all'Address, Data);
end Surface_Add_Listener;
procedure Surface_Set_User_Data (Surface : Surface_Ptr;
Data : Void_Ptr) is
begin
wl_proxy_set_user_data (Surface.all'Access, Data);
end Surface_Set_User_Data;
function Surface_Get_User_Data
(Surface : Surface_Ptr) return Void_Ptr is
begin
return wl_proxy_get_user_data (Surface.all'Access);
end Surface_Get_User_Data;
function Surface_Get_Version
(Surface : Surface_Ptr) return Unsigned_32 is
begin
return wl_proxy_get_version (Surface.all'Access);
end Surface_Get_Version;
procedure Surface_Destroy (Surface : Surface_Ptr) is
begin
Proxy_Marshal (Proxy_Ptr'(Surface.all'Access),
WL_SURFACE_DESTROY);
wl_proxy_destroy (Surface.all'Access);
end Surface_Destroy;
procedure Surface_Attach (Surface : Surface_Ptr;
Buffer : Buffer_Ptr;
X : Integer;
Y : Integer
) is
begin
Proxy_Marshal (Proxy_Ptr'(Surface.all'Access),
WL_SURFACE_ATTACH,
Buffer.all'Address,
X,
Y );
end Surface_Attach;
procedure Surface_Damage (Surface : Surface_Ptr;
X : Integer;
Y : Integer;
Width : Integer;
Height : Integer
) is
begin
Proxy_Marshal (Proxy_Ptr'(Surface.all'Access),
WL_SURFACE_DAMAGE,
X,
Y,
Width,
Height );
end Surface_Damage;
function Surface_Frame (Surface : Surface_Ptr) return Callback_Ptr is
P : constant Proxy_Ptr
:= Proxy_Marshal_Constructor (Surface.all'Access,
WL_SURFACE_FRAME,
Callback_Interface'Access,
0);
begin
return (if P /= null then P.all'Access else null);
end Surface_Frame;
procedure Surface_Set_Opaque_Region (Surface : Surface_Ptr;
Region : Region_Ptr
) is
begin
Proxy_Marshal (Proxy_Ptr'(Surface.all'Access),
WL_SURFACE_SET_OPAQUE_REGION,
Region.all'Address );
end Surface_Set_Opaque_Region;
procedure Surface_Set_Input_Region (Surface : Surface_Ptr;
Region : Region_Ptr
) is
begin
Proxy_Marshal (Proxy_Ptr'(Surface.all'Access),
WL_SURFACE_SET_INPUT_REGION,
Region.all'Address );
end Surface_Set_Input_Region;
procedure Surface_Commit (Surface : Surface_Ptr) is
begin
Proxy_Marshal (Proxy_Ptr'(Surface.all'Access), WL_SURFACE_COMMIT);
end Surface_Commit;
procedure Surface_Set_Buffer_Transform (Surface : Surface_Ptr;
Transform : Integer
) is
begin
Proxy_Marshal (Proxy_Ptr'(Surface.all'Access),
WL_SURFACE_SET_BUFFER_TRANSFORM,
Transform );
end Surface_Set_Buffer_Transform;
procedure Surface_Set_Buffer_Scale (Surface : Surface_Ptr;
Scale : Integer
) is
begin
Proxy_Marshal (Proxy_Ptr'(Surface.all'Access),
WL_SURFACE_SET_BUFFER_SCALE,
Scale );
end Surface_Set_Buffer_Scale;
procedure Surface_Damage_Buffer (Surface : Surface_Ptr;
X : Integer;
Y : Integer;
Width : Integer;
Height : Integer
) is
begin
Proxy_Marshal (Proxy_Ptr'(Surface.all'Access),
WL_SURFACE_DAMAGE_BUFFER,
X,
Y,
Width,
Height );
end Surface_Damage_Buffer;
function Seat_Add_Listener (Seat : Seat_Ptr;
Listener : Seat_Listener_Ptr;
Data : Void_Ptr) return Interfaces.C.int is
begin
return Wl_Proxy_Add_Listener
(Seat.all'Access, Listener.all'Address, Data);
end Seat_Add_Listener;
procedure Seat_Set_User_Data (Seat : Seat_Ptr;
Data : Void_Ptr) is
begin
wl_proxy_set_user_data (Seat.all'Access, Data);
end Seat_Set_User_Data;
function Seat_Get_User_Data (Seat : Seat_Ptr) return Void_Ptr is
begin
return wl_proxy_get_user_data (Seat.all'Access);
end Seat_Get_User_Data;
function Seat_Get_Version (Seat : Seat_Ptr) return Unsigned_32 is
begin
return wl_proxy_get_version (Seat.all'Access);
end Seat_Get_Version;
procedure Seat_Destroy (Seat : Seat_Ptr) is
begin
wl_proxy_destroy (Seat.all'Access);
end Seat_Destroy;
function Seat_Get_Pointer (Seat : Seat_Ptr) return Pointer_Ptr is
P : constant Proxy_Ptr
:= Proxy_Marshal_Constructor (Seat.all'Access,
WL_SEAT_GET_POINTER,
Pointer_Interface'Access,
0);
begin
return (if P /= null then P.all'Access else null);
end Seat_Get_Pointer;
function Seat_Get_Keyboard (Seat : Seat_Ptr) return Keyboard_Ptr is
P : constant Proxy_Ptr
:= Proxy_Marshal_Constructor (Seat.all'Access,
WL_SEAT_GET_KEYBOARD,
Keyboard_Interface'Access,
0);
begin
return (if P /= null then P.all'Access else null);
end Seat_Get_Keyboard;
function Seat_Get_Touch (Seat : Seat_Ptr) return Touch_Ptr is
P : constant Proxy_Ptr
:= Proxy_Marshal_Constructor (Seat.all'Access,
WL_SEAT_GET_TOUCH,
Touch_Interface'Access,
0);
begin
return (if P /= null then P.all'Access else null);
end Seat_Get_Touch;
procedure Seat_Release (Seat : Seat_Ptr) is
begin
Proxy_Marshal (Proxy_Ptr'(Seat.all'Access), WL_SEAT_RELEASE);
end Seat_Release;
function Pointer_Add_Listener
(Pointer : Pointer_Ptr;
Listener : Pointer_Listener_Ptr;
Data : Void_Ptr) return Interfaces.C.Int is
begin
return Wl_Proxy_Add_Listener
(Pointer.all'Access, Listener.all'Address, Data);
end Pointer_Add_Listener;
procedure Pointer_Set_User_Data
(Pointer : Pointer_Ptr;
Data : Void_Ptr) is
begin
wl_proxy_set_user_data (Pointer.all'Access, Data);
end Pointer_Set_User_Data;
function Pointer_Get_User_Data
(Pointer : Pointer_Ptr) return Void_Ptr is
begin
return wl_proxy_get_user_data (Pointer.all'Access);
end Pointer_Get_User_Data;
function Pointer_Get_Version
(Pointer : Pointer_Ptr) return Unsigned_32 is
begin
return wl_proxy_get_version (Pointer.all'Access);
end Pointer_Get_Version;
procedure Pointer_Destroy (Pointer : Pointer_Ptr) is
begin
wl_proxy_destroy (Pointer.all'Access);
end Pointer_Destroy;
procedure Pointer_Set_Cursor (Pointer : Pointer_Ptr;
Serial : Unsigned_32;
Surface : Surface_Ptr;
Hotspot_X : Integer;
Hotspot_Y : Integer
) is
begin
Proxy_Marshal (Proxy_Ptr'(Pointer.all'Access),
WL_POINTER_SET_CURSOR,
Serial,
Surface.all'Address,
Hotspot_X,
Hotspot_Y );
end Pointer_Set_Cursor;
procedure Pointer_Release (Pointer : Pointer_Ptr) is
begin
Proxy_Marshal (Proxy_Ptr'(Pointer.all'Access), WL_POINTER_RELEASE);
end Pointer_Release;
function Keyboard_Add_Listener
(Keyboard : Keyboard_Ptr;
Listener : Keyboard_Listener_Ptr;
Data : Void_Ptr) return Interfaces.C.Int is
begin
return Wl_Proxy_Add_Listener
(Keyboard.all'Access, Listener.all'Address, Data);
end Keyboard_Add_Listener;
procedure Keyboard_Set_User_Data (Keyboard : Keyboard_Ptr;
Data : Void_Ptr) is
begin
wl_proxy_set_user_data (Keyboard.all'Access, Data);
end Keyboard_Set_User_Data;
function Keyboard_Get_User_Data
(Keyboard : Keyboard_Ptr) return Void_Ptr is
begin
return wl_proxy_get_user_data (Keyboard.all'Access);
end Keyboard_Get_User_Data;
function Keyboard_Get_Version
(Keyboard : Keyboard_Ptr) return Unsigned_32 is
begin
return wl_proxy_get_version (Keyboard.all'Access);
end Keyboard_Get_Version;
procedure Keyboard_Destroy (Keyboard : Keyboard_Ptr) is
begin
wl_proxy_destroy (Keyboard.all'Access);
end Keyboard_Destroy;
procedure Keyboard_Release (Keyboard : Keyboard_Ptr) is
begin
Proxy_Marshal
(Proxy_Ptr'(Keyboard.all'Access), WL_KEYBOARD_RELEASE);
end Keyboard_Release;
function Touch_Add_Listener
(Touch : Touch_Ptr;
Listener : Touch_Listener_Ptr;
Data : Void_Ptr) return Interfaces.C.Int is
begin
return Wl_Proxy_Add_Listener
(Touch.all'Access, Listener.all'Address, Data);
end Touch_Add_Listener;
procedure Touch_Set_User_Data (Touch : Touch_Ptr;
Data : Void_Ptr) is
begin
wl_proxy_set_user_data (Touch.all'Access, Data);
end Touch_Set_User_Data;
function Touch_Get_User_Data (Touch : Touch_Ptr) return Void_Ptr is
begin
return wl_proxy_get_user_data (Touch.all'Access);
end Touch_Get_User_Data;
function Touch_Get_Version (Touch : Touch_Ptr) return Unsigned_32 is
begin
return wl_proxy_get_version (Touch.all'Access);
end Touch_Get_Version;
procedure Touch_Destroy (Touch : Touch_Ptr) is
begin
wl_proxy_destroy (Touch.all'Access);
end Touch_Destroy;
procedure Touch_Release (Touch : Touch_Ptr) is
begin
Proxy_Marshal (Proxy_Ptr'(Touch.all'Access), WL_TOUCH_RELEASE);
end Touch_Release;
function Output_Add_Listener
(Output : Output_Ptr;
Listener : Output_Listener_Ptr;
Data : Void_Ptr) return Interfaces.C.Int is
begin
return Wl_Proxy_Add_Listener
(Output.all'Access, Listener.all'Address, Data);
end Output_Add_Listener;
procedure Output_Set_User_Data
(Output : Output_Ptr;
Data : Void_Ptr) is
begin
wl_proxy_set_user_data (Output.all'Access, Data);
end Output_Set_User_Data;
function Output_Get_User_Data (Output : Output_Ptr) return Void_Ptr is
begin
return wl_proxy_get_user_data (Output.all'Access);
end Output_Get_User_Data;
function Output_Get_Version (Output : Output_Ptr) return Unsigned_32 is
begin
return wl_proxy_get_version (Output.all'Access);
end Output_Get_Version;
procedure Output_Destroy (Output : Output_Ptr) is
begin
wl_proxy_destroy (Output.all'Access);
end Output_Destroy;
procedure Output_Release (Output : Output_Ptr) is
begin
Proxy_Marshal (Proxy_Ptr'(Output.all'Access), WL_OUTPUT_RELEASE);
end Output_Release;
procedure Region_Set_User_Data (Region : Region_Ptr;
Data : Void_Ptr) is
begin
wl_proxy_set_user_data (Region.all'Access, Data);
end Region_Set_User_Data;
function Region_Get_User_Data (Region : Region_Ptr) return Void_Ptr is
begin
return wl_proxy_get_user_data (Region.all'Access);
end Region_Get_User_Data;
function Region_Get_Version (Region : Region_Ptr) return Unsigned_32 is
begin
return wl_proxy_get_version (Region.all'Access);
end Region_Get_Version;
procedure Region_Destroy (Region : Region_Ptr) is
begin
Proxy_Marshal (Proxy_Ptr'(Region.all'Access),
WL_REGION_DESTROY);
wl_proxy_destroy (Region.all'Access);
end Region_Destroy;
procedure Region_Add (Region : Region_Ptr;
X : Integer;
Y : Integer;
Width : Integer;
Height : Integer
) is
begin
Proxy_Marshal (Proxy_Ptr'(Region.all'Access),
WL_REGION_ADD,
X,
Y,
Width,
Height );
end Region_Add;
procedure Region_Subtract (Region : Region_Ptr;
X : Integer;
Y : Integer;
Width : Integer;
Height : Integer
) is
begin
Proxy_Marshal (Proxy_Ptr'(Region.all'Access),
WL_REGION_SUBTRACT,
X,
Y,
Width,
Height );
end Region_Subtract;
procedure Subcompositor_Set_User_Data
(Subcompositor : Subcompositor_Ptr;
Data : Void_Ptr) is
begin
wl_proxy_set_user_data (Subcompositor.all'Access, Data);
end Subcompositor_Set_User_Data;
function Subcompositor_Get_User_Data
(Subcompositor : Subcompositor_Ptr) return Void_Ptr is
begin
return wl_proxy_get_user_data (Subcompositor.all'Access);
end Subcompositor_Get_User_Data;
function Subcompositor_Get_Version
(Subcompositor : Subcompositor_Ptr) return Unsigned_32 is
begin
return wl_proxy_get_version (Subcompositor.all'Access);
end Subcompositor_Get_Version;
procedure Subcompositor_Destroy (Subcompositor : Subcompositor_Ptr) is
begin
Proxy_Marshal (Proxy_Ptr'(Subcompositor.all'Access),
WL_SUBCOMPOSITOR_DESTROY);
wl_proxy_destroy (Subcompositor.all'Access);
end Subcompositor_Destroy;
function Subcompositor_Get_Subsurface
(Subcompositor : Subcompositor_Ptr;
Surface : Surface_Ptr;
Parent : Surface_Ptr
) return Subsurface_Ptr
is
P : constant Proxy_Ptr
:= Proxy_Marshal_Constructor (Subcompositor.all'Access,
WL_SUBCOMPOSITOR_GET_SUBSURFACE,
Subsurface_Interface'Access,
0,
Surface.all'Address,
Parent.all'Address);
begin
return (if P /= null then P.all'Access else null);
end Subcompositor_Get_Subsurface;
procedure Subsurface_Set_User_Data (Subsurface : Subsurface_Ptr;
Data : Void_Ptr) is
begin
wl_proxy_set_user_data (Subsurface.all'Access, Data);
end Subsurface_Set_User_Data;
function Subsurface_Get_User_Data
(Subsurface : Subsurface_Ptr) return Void_Ptr is
begin
return wl_proxy_get_user_data (Subsurface.all'Access);
end Subsurface_Get_User_Data;
function Subsurface_Get_Version
(Subsurface : Subsurface_Ptr) return Unsigned_32 is
begin
return wl_proxy_get_version (Subsurface.all'Access);
end Subsurface_Get_Version;
procedure Subsurface_Destroy (Subsurface : Subsurface_Ptr) is
begin
Proxy_Marshal (Proxy_Ptr'(Subsurface.all'Access),
WL_SUBSURFACE_DESTROY);
wl_proxy_destroy (Subsurface.all'Access);
end Subsurface_Destroy;
procedure Subsurface_Set_Position (Subsurface : Subsurface_Ptr;
X : Integer;
Y : Integer
) is
begin
Proxy_Marshal (Proxy_Ptr'(Subsurface.all'Access),
WL_SUBSURFACE_SET_POSITION,
X,
Y );
end Subsurface_Set_Position;
procedure Subsurface_Place_Above (Subsurface : Subsurface_Ptr;
Sibling : Surface_Ptr
) is
begin
Proxy_Marshal (Proxy_Ptr'(Subsurface.all'Access),
WL_SUBSURFACE_PLACE_ABOVE,
Sibling.all'Address );
end Subsurface_Place_Above;
procedure Subsurface_Place_Below (Subsurface : Subsurface_Ptr;
Sibling : Surface_Ptr
) is
begin
Proxy_Marshal (Proxy_Ptr'(Subsurface.all'Access),
WL_SUBSURFACE_PLACE_BELOW,
Sibling.all'Address );
end Subsurface_Place_Below;
procedure Subsurface_Set_Sync (Subsurface : Subsurface_Ptr) is
begin
Proxy_Marshal
(Proxy_Ptr'(Subsurface.all'Access), WL_SUBSURFACE_SET_SYNC);
end Subsurface_Set_Sync;
procedure Subsurface_Set_Desync (Subsurface : Subsurface_Ptr) is
begin
Proxy_Marshal
(Proxy_Ptr'(Subsurface.all'Access), WL_SUBSURFACE_SET_DESYNC);
end Subsurface_Set_Desync;
end Wl_Thin;
use type Wl_Thin.Proxy_Ptr;
subtype Registry_Global_Subprogram_Ptr is Wl_Thin.Registry_Global_Subprogram_Ptr;
subtype Registry_Global_Remove_Subprogram_Ptr is Wl_Thin.Registry_Global_Remove_Subprogram_Ptr;
subtype Registry_Listener_T is Wl_Thin.Registry_Listener_T;
subtype Registry_Listener_Ptr is Wl_Thin.Registry_Listener_Ptr;
package body Display_Events is
package Conversion is new
System.Address_To_Access_Conversions (Data_Type);
procedure Internal_Error (Data : Void_Ptr;
Display : Wl_Thin.Display_Ptr;
Object_Id : Void_Ptr;
Code : Unsigned_32;
Message : chars_ptr) with
Convention => C;
procedure Internal_Delete_Id (Data : Void_Ptr;
Display : Wl_Thin.Display_Ptr;
Id : Unsigned_32) with
Convention => C;
procedure Internal_Error (Data : Void_Ptr;
Display : Wl_Thin.Display_Ptr;
Object_Id : Void_Ptr;
Code : Unsigned_32;
Message : chars_ptr)
is
D : constant Wayland_Client.Display
:= (
My_Display => Display,
My_Fd =>
Wl_Thin.Display_Get_File_Descriptor (Display)
);
M : constant String := Interfaces.C.Strings.Value (Message);
begin
Error (Data_Ptr (Conversion.To_Pointer (Data)),
D,
Object_Id,
Code,
M);
end Internal_Error;
procedure Internal_Delete_Id (Data : Void_Ptr;
Display : Wl_Thin.Display_Ptr;
Id : Unsigned_32)
is
D : constant Wayland_Client.Display
:= (
My_Display => Display,
My_Fd =>
Wl_Thin.Display_Get_File_Descriptor (Display)
);
begin
Delete_Id (Data_Ptr (Conversion.To_Pointer (Data)),
D,
Id);
end Internal_Delete_Id;
Listener : aliased Wl_Thin.Display_Listener_T
:= (
Error => Internal_Error'Unrestricted_Access,
Delete_Id => Internal_Delete_Id'Unrestricted_Access
);
function Subscribe
(Display : in out Wayland_Client.Display;
Data : not null Data_Ptr) return Call_Result_Code
is
I : int;
begin
I := Wl_Thin.Display_Add_Listener (Display.My_Display,
Listener'Access,
Data.all'Address);
if I = 0 then
return Success;
else
return Error;
end if;
end Subscribe;
end Display_Events;
package body Registry_Events is
package Conversion is new
System.Address_To_Access_Conversions (Data_Type);
procedure Internal_Object_Added
(Data : Void_Ptr;
Registry : Wl_Thin.Registry_Ptr;
Id : Unsigned_32;
Interface_V : Wayland_Client.Chars_Ptr;
Version : Unsigned_32) with
Convention => C,
Global => null;
procedure Internal_Object_Added
(Data : Void_Ptr;
Registry : Wl_Thin.Registry_Ptr;
Id : Unsigned_32;
Interface_V : Wayland_Client.Chars_Ptr;
Version : Unsigned_32)
is
R : constant Wayland_Client.Registry := (My_Registry => Registry);
begin
Global_Object_Added (Data_Ptr (Conversion.To_Pointer (Data)),
R,
Id,
Value (Interface_V),
Version);
end Internal_Object_Added;
procedure Internal_Object_Removed (Data : Void_Ptr;
Registry : Wl_Thin.Registry_Ptr;
Id : Unsigned_32) with
Convention => C;
procedure Internal_Object_Removed (Data : Void_Ptr;
Registry : Wl_Thin.Registry_Ptr;
Id : Unsigned_32)
is
R : constant Wayland_Client.Registry := (My_Registry => Registry);
begin
Global_Object_Removed (Data_Ptr (Conversion.To_Pointer (Data)), R, Id);
end Internal_Object_Removed;
Listener : aliased Wayland_Client.Registry_Listener_T :=
(
Global => Internal_Object_Added'Unrestricted_Access,
Global_Remove => Internal_Object_Removed'Unrestricted_Access
);
-- Note: It should be safe to use Unrestricted_Access here since
-- this generic can only be instantiated at library level.
function Subscribe
(Registry : in out Wayland_Client.Registry;
Data : not null Data_Ptr) return Call_Result_Code is
I : int;
begin
I := Wl_Thin.Registry_Add_Listener (Registry.My_Registry,
Listener'Access,
Data.all'Address);
if I = 0 then
return Success;
else
return Error;
end if;
end Subscribe;
end Registry_Events;
package body Callback_Events is
package Conversion is new
System.Address_To_Access_Conversions (Data_Type);
procedure Internal_Done (Data : Void_Ptr;
Callback : Wl_Thin.Callback_Ptr;
Callback_Data : Unsigned_32) with
Convention => C;
procedure Internal_Done (Data : Void_Ptr;
Callback : Wl_Thin.Callback_Ptr;
Callback_Data : Unsigned_32)
is
C : constant Wayland_Client.Callback := (My_Callback => Callback);
begin
Done (Data_Ptr (Conversion.To_Pointer (Data)), C, Callback_Data);
end Internal_Done;
Listener : aliased Wl_Thin.Callback_Listener_T
:= (Done => Internal_Done'Unrestricted_Access);
function Subscribe
(Callback : in out Wayland_Client.Callback;
Data : not null Data_Ptr) return Call_Result_Code
is
I : int;
begin
I := Wl_Thin.Callback_Add_Listener (Callback.My_Callback,
Listener'Access,
Data.all'Address);
if I = 0 then
return Success;
else
return Error;
end if;
end Subscribe;
end Callback_Events;
package body Shm_Events is
package Conversion is new
System.Address_To_Access_Conversions (Data_Type);
procedure Internal_Format (Data : Void_Ptr;
Shm : Wl_Thin.Shm_Ptr;
Format : Unsigned_32) with
Convention => C;
procedure Internal_Format (Data : Void_Ptr;
Shm : Wl_Thin.Shm_Ptr;
Format : Unsigned_32)
is
S : constant Wayland_Client.Shm := (My_Shm => Shm);
begin
Shm_Events.Format
(Data_Ptr (Conversion.To_Pointer (Data)), S, Format);
end Internal_Format;
Listener : aliased Wl_Thin.Shm_Listener_T
:= (Format => Internal_Format'Unrestricted_Access);
function Subscribe
(Shm : in out Wayland_Client.Shm;
Data : not null Data_Ptr) return Call_Result_Code
is
I : int;
begin
I := Wl_Thin.Shm_Add_Listener (Shm.My_Shm,
Listener'Access,
Data.all'Address);
if I = 0 then
return Success;
else
return Error;
end if;
end Subscribe;
end Shm_Events;
package body Buffer_Events is
package Conversion is new
System.Address_To_Access_Conversions (Data_Type);
procedure Internal_Release (Data : Void_Ptr;
Buffer : Wl_Thin.Buffer_Ptr) with
Convention => C;
procedure Internal_Release (Data : Void_Ptr;
Buffer : Wl_Thin.Buffer_Ptr)
is
B : constant Wayland_Client.Buffer := (My_Buffer => Buffer);
begin
Release (Data_Ptr (Conversion.To_Pointer (Data)), B);
end Internal_Release;
Listener : aliased Wl_Thin.Buffer_Listener_T
:= (Release => Internal_Release'Unrestricted_Access);
function Subscribe
(Buffer : in out Wayland_Client.Buffer;
Data : not null Data_Ptr) return Call_Result_Code
is
I : int;
begin
I := Wl_Thin.Buffer_Add_Listener (Buffer.My_Buffer,
Listener'Access,
Data.all'Address);
if I = 0 then
return Success;
else
return Error;
end if;
end Subscribe;
end Buffer_Events;
package body Data_Offer_Events is
package Conversion is new
System.Address_To_Access_Conversions (Data_Type);
procedure Internal_Offer (Data : Void_Ptr;
Data_Offer : Wl_Thin.Data_Offer_Ptr;
Mime_Type : chars_ptr) with
Convention => C;
procedure Internal_Source_Actions
(Data : Void_Ptr;
Data_Offer : Wl_Thin.Data_Offer_Ptr;
Source_Actions : Unsigned_32) with
Convention => C;
procedure Internal_Action (Data : Void_Ptr;
Data_Offer : Wl_Thin.Data_Offer_Ptr;
Dnd_Action : Unsigned_32) with
Convention => C;
procedure Internal_Offer (Data : Void_Ptr;
Data_Offer : Wl_Thin.Data_Offer_Ptr;
Mime_Type : chars_ptr)
is
D : constant Wayland_Client.Data_Offer
:= (My_Data_Offer => Data_Offer);
M : constant String := Interfaces.C.Strings.Value (Mime_Type);
begin
Offer (Data_Ptr (Conversion.To_Pointer (Data)), D, M);
end Internal_Offer;
procedure Internal_Source_Actions
(Data : Void_Ptr;
Data_Offer : Wl_Thin.Data_Offer_Ptr;
Source_Actions : Unsigned_32)
is
D : constant Wayland_Client.Data_Offer
:= (My_Data_Offer => Data_Offer);
begin
Data_Offer_Events.Source_Actions
(Data_Ptr (Conversion.To_Pointer (Data)),
D,
Source_Actions);
end Internal_Source_Actions;
procedure Internal_Action (Data : Void_Ptr;
Data_Offer : Wl_Thin.Data_Offer_Ptr;
Dnd_Action : Unsigned_32)
is
D : constant Wayland_Client.Data_Offer
:= (My_Data_Offer => Data_Offer);
begin
Action (Data_Ptr (Conversion.To_Pointer (Data)),
D,
Dnd_Action);
end Internal_Action;
Listener : aliased Wl_Thin.Data_Offer_Listener_T
:= (Offer => Internal_Offer'Unrestricted_Access,
Source_Actions => Internal_Source_Actions'Unrestricted_Access,
Action => Internal_Action'Unrestricted_Access);
function Subscribe
(Data_Offer : in out Wayland_Client.Data_Offer;
Data : not null Data_Ptr) return Call_Result_Code
is
I : int;
begin
I := Wl_Thin.Data_Offer_Add_Listener (Data_Offer.My_Data_Offer,
Listener'Access,
Data.all'Address);
if I = 0 then
return Success;
else
return Error;
end if;
end Subscribe;
end Data_Offer_Events;
package body Data_Source_Events is
package Conversion is new
System.Address_To_Access_Conversions (Data_Type);
procedure Internal_Target (Data : Void_Ptr;
Data_Source : Wl_Thin.Data_Source_Ptr;
Mime_Type : chars_ptr) with
Convention => C;
procedure Internal_Send (Data : Void_Ptr;
Data_Source : Wl_Thin.Data_Source_Ptr;
Mime_Type : chars_ptr;
Fd : Integer) with
Convention => C;
procedure Internal_Cancelled (Data : Void_Ptr;
Data_Source : Wl_Thin.Data_Source_Ptr) with
Convention => C;
procedure Internal_Dnd_Drop_Performed
(Data : Void_Ptr;
Data_Source : Wl_Thin.Data_Source_Ptr) with
Convention => C;
procedure Internal_Dnd_Finished
(Data : Void_Ptr;
Data_Source : Wl_Thin.Data_Source_Ptr) with
Convention => C;
procedure Internal_Action (Data : Void_Ptr;
Data_Source : Wl_Thin.Data_Source_Ptr;
Dnd_Action : Unsigned_32) with
Convention => C;
procedure Internal_Target (Data : Void_Ptr;
Data_Source : Wl_Thin.Data_Source_Ptr;
Mime_Type : chars_ptr)
is
D : constant Wayland_Client.Data_Source
:= (My_Data_Source => Data_Source);
M : constant String := Interfaces.C.Strings.Value (Mime_Type);
begin
Target (Data_Ptr (Conversion.To_Pointer (Data)), D, M);
end Internal_Target;
procedure Internal_Send (Data : Void_Ptr;
Data_Source : Wl_Thin.Data_Source_Ptr;
Mime_Type : chars_ptr;
Fd : Integer)
is
D : constant Wayland_Client.Data_Source
:= (My_Data_Source => Data_Source);
M : constant String := Interfaces.C.Strings.Value (Mime_Type);
begin
Send (Data_Ptr (Conversion.To_Pointer (Data)), D, M, Fd);
end Internal_Send;
procedure Internal_Cancelled (Data : Void_Ptr;
Data_Source : Wl_Thin.Data_Source_Ptr)
is
D : constant Wayland_Client.Data_Source
:= (My_Data_Source => Data_Source);
begin
Cancelled (Data_Ptr (Conversion.To_Pointer (Data)), D);
end Internal_Cancelled;
procedure Internal_Dnd_Drop_Performed
(Data : Void_Ptr;
Data_Source : Wl_Thin.Data_Source_Ptr)
is
D : constant Wayland_Client.Data_Source
:= (My_Data_Source => Data_Source);
begin
Dnd_Drop_Performed (Data_Ptr (Conversion.To_Pointer (Data)), D);
end Internal_Dnd_Drop_Performed;
procedure Internal_Dnd_Finished (Data : Void_Ptr;
Data_Source : Wl_Thin.Data_Source_Ptr)
is
D : constant Wayland_Client.Data_Source
:= (My_Data_Source => Data_Source);
begin
Dnd_Drop_Performed (Data_Ptr (Conversion.To_Pointer (Data)), D);
end Internal_Dnd_Finished;
procedure Internal_Action (Data : Void_Ptr;
Data_Source : Wl_Thin.Data_Source_Ptr;
Dnd_Action : Unsigned_32)
is
D : constant Wayland_Client.Data_Source
:= (My_Data_Source => Data_Source);
begin
Action (Data_Ptr (Conversion.To_Pointer (Data)), D, Dnd_Action);
end Internal_Action;
Listener : aliased Wl_Thin.Data_Source_Listener_T
:= (Target => Internal_Target'Unrestricted_Access,
Send => Internal_Send'Unrestricted_Access,
Cancelled => Internal_Cancelled'Unrestricted_Access,
Dnd_Drop_Performed =>
Internal_Dnd_Drop_Performed'Unrestricted_Access,
Dnd_Finished => Internal_Dnd_Finished'Unrestricted_Access,
Action => Internal_Action'Unrestricted_Access);
function Subscribe
(Data_Source : in out Wayland_Client.Data_Source;
Data : not null Data_Ptr) return Call_Result_Code
is
I : int;
begin
I := Wl_Thin.Data_Source_Add_Listener (Data_Source.My_Data_Source,
Listener'Access,
Data.all'Address);
if I = 0 then
return Success;
else
return Error;
end if;
end Subscribe;
end Data_Source_Events;
package body Data_Device_Events is
package Conversion is new
System.Address_To_Access_Conversions (Data_Type);
procedure Internal_Data_Offer (Data : Void_Ptr;
Data_Device : Wl_Thin.Data_Device_Ptr;
Id : Unsigned_32) with
Convention => C;
procedure Internal_Enter (Data : Void_Ptr;
Data_Device : Wl_Thin.Data_Device_Ptr;
Serial : Unsigned_32;
Surface : Wl_Thin.Surface_Ptr;
X : Fixed;
Y : Fixed;
Id : Wl_Thin.Data_Offer_Ptr) with
Convention => C;
procedure Internal_Leave (Data : Void_Ptr;
Data_Device : Wl_Thin.Data_Device_Ptr) with
Convention => C;
procedure Internal_Motion (Data : Void_Ptr;
Data_Device : Wl_Thin.Data_Device_Ptr;
Time : Unsigned_32;
X : Fixed;
Y : Fixed) with
Convention => C;
procedure Internal_Drop (Data : Void_Ptr;
Data_Device : Wl_Thin.Data_Device_Ptr) with
Convention => C;
procedure Internal_Selection (Data : Void_Ptr;
Data_Device : Wl_Thin.Data_Device_Ptr;
Id : Wl_Thin.Data_Offer_Ptr) with
Convention => C;
procedure Internal_Data_Offer (Data : Void_Ptr;
Data_Device : Wl_Thin.Data_Device_Ptr;
Id : Unsigned_32)
is
D : constant Wayland_Client.Data_Device
:= (My_Data_Device => Data_Device);
begin
Data_Offer (Data_Ptr (Conversion.To_Pointer (Data)), D, Id);
end Internal_Data_Offer;
procedure Internal_Enter (Data : Void_Ptr;
Data_Device : Wl_Thin.Data_Device_Ptr;
Serial : Unsigned_32;
Surface : Wl_Thin.Surface_Ptr;
X : Fixed;
Y : Fixed;
Id : Wl_Thin.Data_Offer_Ptr)
is
D : constant Wayland_Client.Data_Device
:= (My_Data_Device => Data_Device);
S : constant Wayland_Client.Surface
:= (My_Surface => Surface);
Offer : constant Wayland_Client.Data_Offer
:= (My_Data_Offer => Id);
begin
Enter (Data_Ptr (Conversion.To_Pointer (Data)),
D,
Serial,
S,
X,
Y,
Offer);
end Internal_Enter;
procedure Internal_Leave (Data : Void_Ptr;
Data_Device : Wl_Thin.Data_Device_Ptr)
is
D : constant Wayland_Client.Data_Device
:= (My_Data_Device => Data_Device);
begin
Leave (Data_Ptr (Conversion.To_Pointer (Data)), D);
end Internal_Leave;
procedure Internal_Motion (Data : Void_Ptr;
Data_Device : Wl_Thin.Data_Device_Ptr;
Time : Unsigned_32;
X : Fixed;
Y : Fixed)
is
D : constant Wayland_Client.Data_Device
:= (My_Data_Device => Data_Device);
begin
Motion (Data_Ptr (Conversion.To_Pointer (Data)), D, Time, X, Y);
end Internal_Motion;
procedure Internal_Drop (Data : Void_Ptr;
Data_Device : Wl_Thin.Data_Device_Ptr)
is
D : constant Wayland_Client.Data_Device
:= (My_Data_Device => Data_Device);
begin
Drop (Data_Ptr (Conversion.To_Pointer (Data)), D);
end Internal_Drop;
procedure Internal_Selection (Data : Void_Ptr;
Data_Device : Wl_Thin.Data_Device_Ptr;
Id : Wl_Thin.Data_Offer_Ptr)
is
D : constant Wayland_Client.Data_Device
:= (My_Data_Device => Data_Device);
Offer : constant Wayland_Client.Data_Offer
:= (My_Data_Offer => Id);
begin
Selection (Data_Ptr (Conversion.To_Pointer (Data)), D, Offer);
end Internal_Selection;
Listener : aliased Wl_Thin.Data_Device_Listener_T
:= (Data_Offer => Internal_Data_Offer'Unrestricted_Access,
Enter => Internal_Enter'Unrestricted_Access,
Leave => Internal_Leave'Unrestricted_Access,
Motion => Internal_Motion'Unrestricted_Access,
Drop => Internal_Drop'Unrestricted_Access,
Selection => Internal_Selection'Unrestricted_Access);
function Subscribe
(Data_Device : in out Wayland_Client.Data_Device;
Data : not null Data_Ptr) return Call_Result_Code
is
I : int;
begin
I := Wl_Thin.Data_Device_Add_Listener (Data_Device.My_Data_Device,
Listener'Access,
Data.all'Address);
if I = 0 then
return Success;
else
return Error;
end if;
end Subscribe;
end Data_Device_Events;
package body Shell_Surface_Events is
package Conversion is new
System.Address_To_Access_Conversions (Data_Type);
procedure Internal_Shell_Surface_Ping
(Data : Void_Ptr;
Surface : Wl_Thin.Shell_Surface_Ptr;
Serial : Unsigned_32) with
Convention => C;
procedure Internal_Shell_Surface_Configure
(Data : Void_Ptr;
Surface : Wl_Thin.Shell_Surface_Ptr;
Edges : Unsigned_32;
Width : Integer;
Height : Integer) with
Convention => C;
procedure Internal_Shell_Surface_Popup_Done
(Data : Void_Ptr;
Surface : Wl_Thin.Shell_Surface_Ptr) with
Convention => C;
procedure Internal_Shell_Surface_Ping
(Data : Void_Ptr;
Surface : Wl_Thin.Shell_Surface_Ptr;
Serial : Unsigned_32)
is
S : constant Wayland_Client.Shell_Surface
:= (My_Shell_Surface => Surface);
begin
Shell_Surface_Ping (Data_Ptr (Conversion.To_Pointer (Data)),
S,
Serial);
end Internal_Shell_Surface_Ping;
procedure Internal_Shell_Surface_Configure
(Data : Void_Ptr;
Surface : Wl_Thin.Shell_Surface_Ptr;
Edges : Unsigned_32;
Width : Integer;
Height : Integer)
is
S : constant Wayland_Client.Shell_Surface
:= (My_Shell_Surface => Surface);
begin
Shell_Surface_Configure (Data_Ptr (Conversion.To_Pointer (Data)),
S,
Edges,
Width,
Height);
end Internal_Shell_Surface_Configure;
procedure Internal_Shell_Surface_Popup_Done
(Data : Void_Ptr;
Surface : Wl_Thin.Shell_Surface_Ptr)
is
S : constant Wayland_Client.Shell_Surface
:= (My_Shell_Surface => Surface);
begin
Shell_Surface_Popup_Done (Data_Ptr (Conversion.To_Pointer (Data)), S);
end Internal_Shell_Surface_Popup_Done;
Listener : aliased Wl_Thin.Shell_Surface_Listener_T :=
(
Ping => Internal_Shell_Surface_Ping'Unrestricted_Access,
Configure => Internal_Shell_Surface_Configure'Unrestricted_Access,
Popup_Done => Internal_Shell_Surface_Popup_Done'Unrestricted_Access
);
function Subscribe
(Surface : in out Wayland_Client.Shell_Surface;
Data : not null Data_Ptr) return Call_Result_Code
is
I : int;
begin
I := Wl_Thin.Shell_Surface_Add_Listener
(Surface.My_Shell_Surface,
Listener'Access,
Data.all'Address);
if I = 0 then
return Success;
else
return Error;
end if;
end Subscribe;
end Shell_Surface_Events;
package body Surface_Events is
package Conversion is new
System.Address_To_Access_Conversions (Data_Type);
procedure Internal_Enter (Data : Void_Ptr;
Surface : Wl_Thin.Surface_Ptr;
Output : Wl_Thin.Output_Ptr) with
Convention => C;
procedure Internal_Leave (Data : Void_Ptr;
Surface : Wl_Thin.Surface_Ptr;
Output : Wl_Thin.Output_Ptr) with
Convention => C;
procedure Internal_Enter (Data : Void_Ptr;
Surface : Wl_Thin.Surface_Ptr;
Output : Wl_Thin.Output_Ptr)
is
S : constant Wayland_Client.Surface := (My_Surface => Surface);
O : constant Wayland_Client.Output := (My_Output => Output);
begin
Enter (Data_Ptr (Conversion.To_Pointer (Data)), S, O);
end Internal_Enter;
procedure Internal_Leave (Data : Void_Ptr;
Surface : Wl_Thin.Surface_Ptr;
Output : Wl_Thin.Output_Ptr)
is
S : constant Wayland_Client.Surface := (My_Surface => Surface);
O : constant Wayland_Client.Output := (My_Output => Output);
begin
Leave (Data_Ptr (Conversion.To_Pointer (Data)), S, O);
end Internal_Leave;
Listener : aliased Wl_Thin.Surface_Listener_T
:= (Enter => Internal_Enter'Unrestricted_Access,
Leave => Internal_Leave'Unrestricted_Access);
function Subscribe
(Surface : in out Wayland_Client.Surface;
Data : not null Data_Ptr) return Call_Result_Code
is
I : int;
begin
I := Wl_Thin.Surface_Add_Listener (Surface.My_Surface,
Listener'Access,
Data.all'Address);
if I = 0 then
return Success;
else
return Error;
end if;
end Subscribe;
end Surface_Events;
package body Seat_Events is
package Conversion is new
System.Address_To_Access_Conversions (Data_Type);
procedure Internal_Seat_Capabilities (Data : Void_Ptr;
Seat : Wl_Thin.Seat_Ptr;
Capabilities : Unsigned_32) with
Convention => C;
procedure Internal_Seat_Capabilities (Data : Void_Ptr;
Seat : Wl_Thin.Seat_Ptr;
Capabilities : Unsigned_32)
is
S : constant Wayland_Client.Seat := (My_Seat => Seat);
begin
Seat_Capabilities (Data_Ptr (Conversion.To_Pointer (Data)),
S,
Capabilities);
end Internal_Seat_Capabilities;
procedure Internal_Seat_Name
(Data : Void_Ptr;
Seat : Wl_Thin.Seat_Ptr;
Name : Interfaces.C.Strings.Chars_Ptr) with
Convention => C;
procedure Internal_Seat_Name
(Data : Void_Ptr;
Seat : Wl_Thin.Seat_Ptr;
Name : Interfaces.C.Strings.Chars_Ptr)
is
N : constant String := Interfaces.C.Strings.Value (Name);
S : constant Wayland_Client.Seat := (My_Seat => Seat);
begin
Seat_Name (Data_Ptr (Conversion.To_Pointer (Data)), S, N);
end Internal_Seat_Name;
Seat_Listener : aliased Wl_Thin.Seat_Listener_T :=
(
Capabilities => Internal_Seat_Capabilities'Unrestricted_Access,
Name => Internal_Seat_Name'Unrestricted_Access
);
function Subscribe
(Seat : in out Wayland_Client.Seat;
Data : not null Data_Ptr) return Call_Result_Code
is
I : int;
begin
I := Wl_Thin.Seat_Add_Listener
(Seat => Seat.My_Seat,
Listener => Seat_Listener'Access,
Data => Data.all'Address);
if I = 0 then
return Success;
else
return Error;
end if;
end Subscribe;
end Seat_Events;
package body Pointer_Events is
package Conversion is new
System.Address_To_Access_Conversions (Data_Type);
procedure Internal_Pointer_Enter
(Data : Void_Ptr;
Pointer : Wl_Thin.Pointer_Ptr;
Serial : Unsigned_32;
Surface : Wl_Thin.Surface_Ptr;
Surface_X : Wayland_Client.Fixed;
Surface_Y : Wayland_Client.Fixed) with
Convention => C;
procedure Internal_Pointer_Leave
(Data : Void_Ptr;
Pointer : Wl_Thin.Pointer_Ptr;
Serial : Unsigned_32;
Surface : Wl_Thin.Surface_Ptr) with
Convention => C;
procedure Internal_Pointer_Motion
(Data : Void_Ptr;
Pointer : Wl_Thin.Pointer_Ptr;
Time : Unsigned_32;
Surface_X : Wayland_Client.Fixed;
Surface_Y : Wayland_Client.Fixed) with
Convention => C;
procedure Internal_Pointer_Button
(Data : Void_Ptr;
Pointer : Wl_Thin.Pointer_Ptr;
Serial : Unsigned_32;
Time : Unsigned_32;
Button : Unsigned_32;
State : Unsigned_32) with
Convention => C;
procedure Internal_Pointer_Axis
(Data : Void_Ptr;
Pointer : Wl_Thin.Pointer_Ptr;
Time : Unsigned_32;
Axis : Unsigned_32;
Value : Wayland_Client.Fixed) with
Convention => C;
procedure Internal_Pointer_Frame (Data : Void_Ptr;
Pointer : Wl_Thin.Pointer_Ptr) with
Convention => C;
procedure Internal_Pointer_Axis_Source
(Data : Void_Ptr;
Pointer : Wl_Thin.Pointer_Ptr;
Axis_Source : Unsigned_32) with
Convention => C;
procedure Internal_Pointer_Axis_Stop
(Data : Void_Ptr;
Pointer : Wl_Thin.Pointer_Ptr;
Time : Unsigned_32;
Axis : Unsigned_32) with
Convention => C;
procedure Internal_Pointer_Axis_Discrete
(Data : Void_Ptr;
Pointer : Wl_Thin.Pointer_Ptr;
Axis : Unsigned_32;
Discrete : Integer) with
Convention => C;
procedure Internal_Pointer_Enter
(Data : Void_Ptr;
Pointer : Wl_Thin.Pointer_Ptr;
Serial : Unsigned_32;
Surface : Wl_Thin.Surface_Ptr;
Surface_X : Wayland_Client.Fixed;
Surface_Y : Wayland_Client.Fixed)
is
P : constant Wayland_Client.Pointer := (My_Pointer => Pointer);
S : constant Wayland_Client.Surface := (My_Surface => Surface);
begin
Pointer_Enter (Data_Ptr (Conversion.To_Pointer (Data)),
P,
Serial,
S,
Surface_X,
Surface_Y);
end Internal_Pointer_Enter;
procedure Internal_Pointer_Leave
(Data : Void_Ptr;
Pointer : Wl_Thin.Pointer_Ptr;
Serial : Unsigned_32;
Surface : Wl_Thin.Surface_Ptr)
is
P : constant Wayland_Client.Pointer := (My_Pointer => Pointer);
S : constant Wayland_Client.Surface := (My_Surface => Surface);
begin
Pointer_Leave (Data_Ptr (Conversion.To_Pointer (Data)), P, Serial, S);
end Internal_Pointer_Leave;
procedure Internal_Pointer_Motion
(Data : Void_Ptr;
Pointer : Wl_Thin.Pointer_Ptr;
Time : Unsigned_32;
Surface_X : Wayland_Client.Fixed;
Surface_Y : Wayland_Client.Fixed)
is
P : constant Wayland_Client.Pointer := (My_Pointer => Pointer);
begin
Pointer_Motion (Data_Ptr (Conversion.To_Pointer (Data)),
P,
Time,
Surface_X,
Surface_Y);
end Internal_Pointer_Motion;
procedure Internal_Pointer_Button
(Data : Void_Ptr;
Pointer : Wl_Thin.Pointer_Ptr;
Serial : Unsigned_32;
Time : Unsigned_32;
Button : Unsigned_32;
State : Unsigned_32)
is
P : constant Wayland_Client.Pointer := (My_Pointer => Pointer);
begin
Pointer_Button (Data_Ptr (Conversion.To_Pointer (Data)),
P,
Serial,
Time,
Button,
State);
end Internal_Pointer_Button;
procedure Internal_Pointer_Axis
(Data : Void_Ptr;
Pointer : Wl_Thin.Pointer_Ptr;
Time : Unsigned_32;
Axis : Unsigned_32;
Value : Wayland_Client.Fixed)
is
P : constant Wayland_Client.Pointer := (My_Pointer => Pointer);
begin
Pointer_Axis (Data_Ptr (Conversion.To_Pointer (Data)),
P,
Time,
Axis,
Value);
end Internal_Pointer_Axis;
procedure Internal_Pointer_Frame (Data : Void_Ptr;
Pointer : Wl_Thin.Pointer_Ptr)
is
P : constant Wayland_Client.Pointer := (My_Pointer => Pointer);
begin
Pointer_Frame (Data_Ptr (Conversion.To_Pointer (Data)), P);
end Internal_Pointer_Frame;
procedure Internal_Pointer_Axis_Source
(Data : Void_Ptr;
Pointer : Wl_Thin.Pointer_Ptr;
Axis_Source : Unsigned_32)
is
P : constant Wayland_Client.Pointer := (My_Pointer => Pointer);
begin
Pointer_Axis_Source (Data_Ptr (Conversion.To_Pointer (Data)),
P,
Axis_Source);
end Internal_Pointer_Axis_Source;
procedure Internal_Pointer_Axis_Stop
(Data : Void_Ptr;
Pointer : Wl_Thin.Pointer_Ptr;
Time : Unsigned_32;
Axis : Unsigned_32)
is
P : constant Wayland_Client.Pointer := (My_Pointer => Pointer);
begin
Pointer_Axis_Stop (Data_Ptr (Conversion.To_Pointer (Data)),
P,
Time,
Axis);
end Internal_Pointer_Axis_Stop;
procedure Internal_Pointer_Axis_Discrete
(Data : Void_Ptr;
Pointer : Wl_Thin.Pointer_Ptr;
Axis : Unsigned_32;
Discrete : Integer)
is
P : constant Wayland_Client.Pointer := (My_Pointer => Pointer);
begin
Pointer_Axis_Discrete (Data_Ptr (Conversion.To_Pointer (Data)),
P,
Axis,
Discrete);
end Internal_Pointer_Axis_Discrete;
Pointer_Listener : aliased Wl_Thin.Pointer_Listener_T :=
(
Enter => Internal_Pointer_Enter'Unrestricted_Access,
Leave => Internal_Pointer_Leave'Unrestricted_Access,
Motion => Internal_Pointer_Motion'Unrestricted_Access,
Button => Internal_Pointer_Button'Unrestricted_Access,
Axis => Internal_Pointer_Axis'Unrestricted_Access,
Frame => Internal_Pointer_Frame'Unrestricted_Access,
Axis_Source => Internal_Pointer_Axis_Source'Unrestricted_Access,
Axis_Stop => Internal_Pointer_Axis_Stop'Unrestricted_Access,
Axis_Discrete => Internal_Pointer_Axis_Discrete'Unrestricted_Access
);
function Subscribe
(Pointer : in out Wayland_Client.Pointer;
Data : not null Data_Ptr) return Call_Result_Code
is
I : int;
begin
I := Wl_Thin.Pointer_Add_Listener
(Pointer => Pointer.My_Pointer,
Listener => Pointer_Listener'Access,
Data => Data.all'Address);
if I = 0 then
return Success;
else
return Error;
end if;
end Subscribe;
end Pointer_Events;
package body Keyboard_Events is
package Conversion is new
System.Address_To_Access_Conversions (Data_Type);
procedure Internal_Keymap (Data : Void_Ptr;
Keyboard : Wl_Thin.Keyboard_Ptr;
Format : Unsigned_32;
Fd : Integer;
Size : Unsigned_32) with
Convention => C;
procedure Internal_Enter (Data : Void_Ptr;
Keyboard : Wl_Thin.Keyboard_Ptr;
Serial : Unsigned_32;
Surface : Wl_Thin.Surface_Ptr;
Keys : Wayland_Array_T) with
Convention => C;
procedure Internal_Leave (Data : Void_Ptr;
Keyboard : Wl_Thin.Keyboard_Ptr;
Serial : Unsigned_32;
Surface : Wl_Thin.Surface_Ptr) with
Convention => C;
procedure Internal_Key (Data : Void_Ptr;
Keyboard : Wl_Thin.Keyboard_Ptr;
Serial : Unsigned_32;
Time : Unsigned_32;
Key : Unsigned_32;
State : Unsigned_32) with
Convention => C;
procedure Internal_Modifiers (Data : Void_Ptr;
Keyboard : Wl_Thin.Keyboard_Ptr;
Serial : Unsigned_32;
Mods_Depressed : Unsigned_32;
Mods_Latched : Unsigned_32;
Mods_Locked : Unsigned_32;
Group : Unsigned_32) with
Convention => C;
procedure Internal_Repeat_Info (Data : Void_Ptr;
Keyboard : Wl_Thin.Keyboard_Ptr;
Rate : Integer;
Delay_V : Integer) with
Convention => C;
procedure Internal_Keymap (Data : Void_Ptr;
Keyboard : Wl_Thin.Keyboard_Ptr;
Format : Unsigned_32;
Fd : Integer;
Size : Unsigned_32)
is
K : constant Wayland_Client.Keyboard := (My_Keyboard => Keyboard);
begin
Keymap (Data_Ptr (Conversion.To_Pointer (Data)),
K,
Format,
Fd,
Size);
end Internal_Keymap;
procedure Internal_Enter (Data : Void_Ptr;
Keyboard : Wl_Thin.Keyboard_Ptr;
Serial : Unsigned_32;
Surface : Wl_Thin.Surface_Ptr;
Keys : Wayland_Array_T)
is
K : constant Wayland_Client.Keyboard := (My_Keyboard => Keyboard);
S : constant Wayland_Client.Surface := (My_Surface => Surface);
begin
Enter (Data_Ptr (Conversion.To_Pointer (Data)),
K,
Serial,
S,
Keys);
end Internal_Enter;
procedure Internal_Leave (Data : Void_Ptr;
Keyboard : Wl_Thin.Keyboard_Ptr;
Serial : Unsigned_32;
Surface : Wl_Thin.Surface_Ptr)
is
K : constant Wayland_Client.Keyboard := (My_Keyboard => Keyboard);
S : constant Wayland_Client.Surface := (My_Surface => Surface);
begin
Leave (Data_Ptr (Conversion.To_Pointer (Data)),
K,
Serial,
S);
end Internal_Leave;
procedure Internal_Key (Data : Void_Ptr;
Keyboard : Wl_Thin.Keyboard_Ptr;
Serial : Unsigned_32;
Time : Unsigned_32;
Key : Unsigned_32;
State : Unsigned_32)
is
K : constant Wayland_Client.Keyboard := (My_Keyboard => Keyboard);
begin
Keyboard_Events.Key (Data_Ptr (Conversion.To_Pointer (Data)),
K,
Serial,
Time,
Key,
State);
end Internal_Key;
procedure Internal_Modifiers (Data : Void_Ptr;
Keyboard : Wl_Thin.Keyboard_Ptr;
Serial : Unsigned_32;
Mods_Depressed : Unsigned_32;
Mods_Latched : Unsigned_32;
Mods_Locked : Unsigned_32;
Group : Unsigned_32)
is
K : constant Wayland_Client.Keyboard := (My_Keyboard => Keyboard);
begin
Modifiers (Data_Ptr (Conversion.To_Pointer (Data)),
K,
Serial,
Mods_Depressed,
Mods_Latched,
Mods_Locked,
Group);
end Internal_Modifiers;
procedure Internal_Repeat_Info (Data : Void_Ptr;
Keyboard : Wl_Thin.Keyboard_Ptr;
Rate : Integer;
Delay_V : Integer)
is
K : constant Wayland_Client.Keyboard := (My_Keyboard => Keyboard);
begin
Repeat_Info (Data_Ptr (Conversion.To_Pointer (Data)),
K,
Rate,
Delay_V);
end Internal_Repeat_Info;
Listener : aliased Wl_Thin.Keyboard_Listener_T
:= (Keymap => Internal_Keymap'Unrestricted_Access,
Enter => Internal_Enter'Unrestricted_Access,
Leave => Internal_Leave'Unrestricted_Access,
Key => Internal_Key'Unrestricted_Access,
Modifiers => Internal_Modifiers'Unrestricted_Access,
Repeat_Info => Internal_Repeat_Info'Unrestricted_Access);
function Subscribe
(Keyboard : in out Wayland_Client.Keyboard;
Data : not null Data_Ptr) return Call_Result_Code
is
I : int;
begin
I := Wl_Thin.Keyboard_Add_Listener
(Keyboard => Keyboard.My_Keyboard,
Listener => Listener'Access,
Data => Data.all'Address);
if I = 0 then
return Success;
else
return Error;
end if;
end Subscribe;
end Keyboard_Events;
package body Touch_Events is
package Conversion is new
System.Address_To_Access_Conversions (Data_Type);
procedure Internal_Down (Data : Void_Ptr;
Touch : Wl_Thin.Touch_Ptr;
Serial : Unsigned_32;
Time : Unsigned_32;
Surface : Wl_Thin.Surface_Ptr;
Id : Integer;
X : Fixed;
Y : Fixed) with
Convention => C;
procedure Internal_Up (Data : Void_Ptr;
Touch : Wl_Thin.Touch_Ptr;
Serial : Unsigned_32;
Time : Unsigned_32;
Id : Integer) with
Convention => C;
procedure Internal_Motion (Data : Void_Ptr;
Touch : Wl_Thin.Touch_Ptr;
Time : Unsigned_32;
Id : Integer;
X : Fixed;
Y : Fixed) with
Convention => C;
procedure Internal_Frame (Data : Void_Ptr;
Touch : Wl_Thin.Touch_Ptr) with
Convention => C;
procedure Internal_Cancel (Data : Void_Ptr;
Touch : Wl_Thin.Touch_Ptr) with
Convention => C;
procedure Internal_Shape (Data : Void_Ptr;
Touch : Wl_Thin.Touch_Ptr;
Id : Integer;
Major : Fixed;
Minor : Fixed) with
Convention => C;
procedure Internal_Orientation (Data : Void_Ptr;
Touch : Wl_Thin.Touch_Ptr;
Id : Integer;
Orientation : Fixed) with
Convention => C;
procedure Internal_Down (Data : Void_Ptr;
Touch : Wl_Thin.Touch_Ptr;
Serial : Unsigned_32;
Time : Unsigned_32;
Surface : Wl_Thin.Surface_Ptr;
Id : Integer;
X : Fixed;
Y : Fixed)
is
T : constant Wayland_Client.Touch := (My_Touch => Touch);
S : constant Wayland_Client.Surface := (My_Surface => Surface);
begin
Down (Data_Ptr (Conversion.To_Pointer (Data)),
T,
Serial,
Time,
S,
Id,
X,
Y);
end Internal_Down;
procedure Internal_Up (Data : Void_Ptr;
Touch : Wl_Thin.Touch_Ptr;
Serial : Unsigned_32;
Time : Unsigned_32;
Id : Integer)
is
T : constant Wayland_Client.Touch := (My_Touch => Touch);
begin
Up (Data_Ptr (Conversion.To_Pointer (Data)),
T,
Serial,
Time,
Id);
end Internal_Up;
procedure Internal_Motion (Data : Void_Ptr;
Touch : Wl_Thin.Touch_Ptr;
Time : Unsigned_32;
Id : Integer;
X : Fixed;
Y : Fixed)
is
T : constant Wayland_Client.Touch := (My_Touch => Touch);
begin
Motion (Data_Ptr (Conversion.To_Pointer (Data)),
T,
Time,
Id,
X,
Y);
end Internal_Motion;
procedure Internal_Frame (Data : Void_Ptr;
Touch : Wl_Thin.Touch_Ptr)
is
T : constant Wayland_Client.Touch := (My_Touch => Touch);
begin
Frame (Data_Ptr (Conversion.To_Pointer (Data)), T);
end Internal_Frame;
procedure Internal_Cancel (Data : Void_Ptr;
Touch : Wl_Thin.Touch_Ptr)
is
T : constant Wayland_Client.Touch := (My_Touch => Touch);
begin
Cancel (Data_Ptr (Conversion.To_Pointer (Data)), T);
end Internal_Cancel;
procedure Internal_Shape (Data : Void_Ptr;
Touch : Wl_Thin.Touch_Ptr;
Id : Integer;
Major : Fixed;
Minor : Fixed)
is
T : constant Wayland_Client.Touch := (My_Touch => Touch);
begin
Shape (Data_Ptr (Conversion.To_Pointer (Data)),
T,
Id,
Major,
Minor);
end Internal_Shape;
procedure Internal_Orientation (Data : Void_Ptr;
Touch : Wl_Thin.Touch_Ptr;
Id : Integer;
Orientation : Fixed)
is
T : constant Wayland_Client.Touch := (My_Touch => Touch);
begin
Touch_Events.Orientation (Data_Ptr (Conversion.To_Pointer (Data)),
T,
Id,
Orientation);
end Internal_Orientation;
Listener : aliased Wl_Thin.Touch_Listener_T
:= (Down => Internal_Down'Unrestricted_Access,
Up => Internal_Up'Unrestricted_Access,
Motion => Internal_Motion'Unrestricted_Access,
Frame => Internal_Frame'Unrestricted_Access,
Cancel => Internal_Cancel'Unrestricted_Access,
Shape => Internal_Shape'Unrestricted_Access,
Orientation => Internal_Orientation'Unrestricted_Access);
function Subscribe
(Touch : in out Wayland_Client.Touch;
Data : not null Data_Ptr) return Call_Result_Code
is
I : int;
begin
I := Wl_Thin.Touch_Add_Listener (Touch => Touch.My_Touch,
Listener => Listener'Access,
Data => Data.all'Address);
if I = 0 then
return Success;
else
return Error;
end if;
end Subscribe;
end Touch_Events;
package body Output_Events is
package Conversion is new
System.Address_To_Access_Conversions (Data_Type);
procedure Internal_Geometry (Data : Void_Ptr;
Output : Wl_Thin.Output_Ptr;
X : Integer;
Y : Integer;
Physical_Width : Integer;
Physical_Height : Integer;
Subpixel : Integer;
Make : chars_ptr;
Model : chars_ptr;
Transform : Integer) with
Convention => C;
procedure Internal_Mode (Data : Void_Ptr;
Output : Wl_Thin.Output_Ptr;
Flags : Unsigned_32;
Width : Integer;
Height : Integer;
Refresh : Integer) with
Convention => C;
procedure Internal_Done (Data : Void_Ptr;
Output : Wl_Thin.Output_Ptr) with
Convention => C;
procedure Internal_Scale (Data : Void_Ptr;
Output : Wl_Thin.Output_Ptr;
Factor : Integer) with
Convention => C;
procedure Internal_Geometry (Data : Void_Ptr;
Output : Wl_Thin.Output_Ptr;
X : Integer;
Y : Integer;
Physical_Width : Integer;
Physical_Height : Integer;
Subpixel : Integer;
Make : chars_ptr;
Model : chars_ptr;
Transform : Integer)
is
O : constant Wayland_Client.Output := (My_Output => Output);
Ma : constant String := Interfaces.C.Strings.Value (Make);
Mo : constant String := Interfaces.C.Strings.Value (Model);
begin
Geometry (Data_Ptr (Conversion.To_Pointer (Data)),
O,
X,
Y,
Physical_Width,
Physical_Height,
Subpixel,
Ma,
Mo,
Transform);
end Internal_Geometry;
procedure Internal_Mode (Data : Void_Ptr;
Output : Wl_Thin.Output_Ptr;
Flags : Unsigned_32;
Width : Integer;
Height : Integer;
Refresh : Integer)
is
O : constant Wayland_Client.Output := (My_Output => Output);
begin
Mode (Data_Ptr (Conversion.To_Pointer (Data)),
O,
Flags,
Width,
Height,
Refresh);
end Internal_Mode;
procedure Internal_Done (Data : Void_Ptr;
Output : Wl_Thin.Output_Ptr)
is
O : constant Wayland_Client.Output := (My_Output => Output);
begin
Done (Data_Ptr (Conversion.To_Pointer (Data)), O);
end Internal_Done;
procedure Internal_Scale (Data : Void_Ptr;
Output : Wl_Thin.Output_Ptr;
Factor : Integer)
is
O : constant Wayland_Client.Output := (My_Output => Output);
begin
Scale (Data_Ptr (Conversion.To_Pointer (Data)), O, Factor);
end Internal_Scale;
Listener : aliased Wl_Thin.Output_Listener_T
:= (Geometry => Internal_Geometry'Unrestricted_Access,
Mode => Internal_Mode'Unrestricted_Access,
Done => Internal_Done'Unrestricted_Access,
Scale => Internal_Scale'Unrestricted_Access);
function Subscribe
(Output : in out Wayland_Client.Output;
Data : not null Data_Ptr) return Call_Result_Code
is
I : int;
begin
I := Wl_Thin.Output_Add_Listener (Output => Output.My_Output,
Listener => Listener'Access,
Data => Data.all'Address);
if I = 0 then
return Success;
else
return Error;
end if;
end Subscribe;
end Output_Events;
procedure Connect (Display : in out Wayland_Client.Display;
Name : String := Default_Display_Name) is
begin
Display.My_Display := Wl_Thin.Display_Connect (+Name);
if Display.My_Display /= null then
Display.My_Fd :=
Wl_Thin.Display_Get_File_Descriptor (Display.My_Display);
if Display.My_Fd = -1 then
Display.Disconnect;
Display.My_Display := null;
end if;
end if;
end Connect;
procedure Disconnect (Display : in out Wayland_Client.Display) is
begin
if Display.My_Display /= null then
Wl_Thin.Display_Disconnect (Display.My_Display);
end if;
end Disconnect;
function Check_For_Events
(Display : Wayland_Client.Display;
Timeout : Integer) return Check_For_Events_Status
is
File_Descriptors : constant Linux.Poll_File_Descriptor_Array
:= (1 => (Descriptor => Display.My_Fd,
Events => Linux.POLLIN,
Revents => 0));
I : constant Integer := Linux.Poll (File_Descriptors, Timeout);
begin
case I is
when 1..Integer'Last => return Events_Need_Processing;
when 0 => return No_Events;
when Integer'First..-1 => return Error;
end case;
end Check_For_Events;
function Get_Version
(Display : Wayland_Client.Display) return Unsigned_32 is
begin
return Wl_Thin.Display_Get_Version (Display.My_Display);
end Get_Version;
procedure Get_Registry (Display : Wayland_Client.Display;
Registry : in out Wayland_Client.Registry) is
begin
Registry.My_Registry
:= Wl_Thin.Display_Get_Registry (Display.My_Display);
end Get_Registry;
procedure Destroy (Registry : in out Wayland_Client.Registry) is
begin
if Registry.My_Registry /= null then
Wl_Thin.Registry_Destroy (Registry.My_Registry);
Registry.My_Registry := null;
end if;
end Destroy;
function Dispatch (Display : Wayland_Client.Display) return Integer is
begin
return Integer (Wl_Thin.Display_Dispatch (Display.My_Display));
end Dispatch;
function Dispatch_Pending
(Display : Wayland_Client.Display) return Integer is
begin
return Wl_Thin.Display_Dispatch_Pending (Display.My_Display);
end Dispatch_Pending;
function Prepare_Read
(Display : Wayland_Client.Display) return Integer is
begin
return Wl_Thin.Display_Prepare_Read (Display.My_Display);
end Prepare_Read;
function Read_Events
(Display : Wayland_Client.Display) return Call_Result_Code
is
I : constant Integer
:= Wl_Thin.Display_Read_Events (Display.My_Display);
begin
if I = 0 then
return Success;
else
return Error;
end if;
end Read_Events;
procedure Cancel_Read (Display : Wayland_Client.Display) is
begin
Wl_Thin.Display_Cancel_Read (Display.My_Display);
end Cancel_Read;
procedure Dispatch (Display : Wayland_Client.Display) is
I : Integer;
pragma Unreferenced (I);
begin
I := Display.Dispatch;
end Dispatch;
function Roundtrip (Display : Wayland_Client.Display) return Integer is
begin
return Integer (Wl_Thin.Display_Roundtrip (Display.My_Display));
end Roundtrip;
procedure Roundtrip (Display : Wayland_Client.Display) is
I : Integer;
pragma Unreferenced (I);
begin
I := Display.Roundtrip;
end Roundtrip;
procedure Get_Proxy (Compositor : in out Wayland_Client.Compositor;
Registry : Wayland_Client.Registry;
Id : Unsigned_32;
Version : Unsigned_32)
is
P : constant Wl_Thin.Proxy_Ptr :=
Wl_Thin.Registry_Bind
(Registry => Registry.My_Registry,
Name => Id,
Interface_V => Wl_Thin.Compositor_Interface'Access,
New_Id => Version);
begin
if P /= null then
Compositor.My_Compositor := P.all'Access;
end if;
end Get_Proxy;
procedure Get_Surface_Proxy (Compositor : Wayland_Client.Compositor;
Surface : in out Wayland_Client.Surface) is
begin
Surface.My_Surface :=
Wl_Thin.Compositor_Create_Surface (Compositor.My_Compositor);
end Get_Surface_Proxy;
procedure Get_Region_Proxy (Compositor : Wayland_Client.Compositor;
Region : in out Wayland_Client.Region) is
begin
Region.My_Region :=
Wl_Thin.Compositor_Create_Region (Compositor.My_Compositor);
end Get_Region_Proxy;
procedure Destroy (Compositor : in out Wayland_Client.Compositor) is
begin
if Compositor.My_Compositor /= null then
Wl_Thin.Compositor_Destroy (Compositor.My_Compositor);
Compositor.My_Compositor := null;
end if;
end Destroy;
function Get_Version (Seat : Wayland_Client.Seat) return Unsigned_32 is
begin
return Wl_Thin.Seat_Get_Version (Seat.My_Seat);
end Get_Version;
procedure Get_Proxy (Seat : in out Wayland_Client.Seat;
Registry : Wayland_Client.Registry;
Id : Unsigned_32;
Version : Unsigned_32)
is
P : constant Wl_Thin.Proxy_Ptr :=
Wl_Thin.Registry_Bind (Registry => Registry.My_Registry,
Name => Id,
Interface_V => Wl_Thin.Seat_Interface'Access,
New_Id => Version);
begin
if P /= null then
Seat.My_Seat := P.all'Access;
end if;
end Get_Proxy;
procedure Get_Pointer (Seat : Wayland_Client.Seat;
Pointer : in out Wayland_Client.Pointer) is
begin
Pointer.My_Pointer := Wl_Thin.Seat_Get_Pointer (Seat.My_Seat);
end Get_Pointer;
procedure Get_Keyboard (Seat : Wayland_Client.Seat;
Keyboard : in out Wayland_Client.Keyboard) is
begin
Keyboard.My_Keyboard := Wl_Thin.Seat_Get_Keyboard (Seat.My_Seat);
end Get_Keyboard;
procedure Get_Touch (Seat : Wayland_Client.Seat;
Touch : in out Wayland_Client.Touch) is
begin
Touch.My_Touch := Wl_Thin.Seat_Get_Touch (Seat.My_Seat);
end Get_Touch;
procedure Release (Seat : in out Wayland_Client.Seat) is
begin
Wl_Thin.Seat_Release (Seat.My_Seat);
Seat.My_Seat := null;
end Release;
procedure Get_Proxy (Shell : in out Wayland_Client.Shell;
Registry : Wayland_Client.Registry;
Id : Unsigned_32;
Version : Unsigned_32)
is
P : constant Wl_Thin.Proxy_Ptr :=
Wl_Thin.Registry_Bind (Registry => Registry.My_Registry,
Name => Id,
Interface_V => Wl_Thin.Shell_Interface'Access,
New_Id => Version);
begin
if P /= null then
Shell.My_Shell := P.all'Access;
end if;
end Get_Proxy;
procedure Get_Shell_Surface (Shell : Wayland_Client.Shell;
Surface : Wayland_Client.Surface;
Shell_Surface : in out Wayland_Client.Shell_Surface) is
begin
Shell_Surface.My_Shell_Surface :=
Wl_Thin.Shell_Get_Shell_Surface (Shell.My_Shell, Surface.My_Surface);
end Get_Shell_Surface;
procedure Get_Proxy (Shm : in out Wayland_Client.Shm;
Registry : Wayland_Client.Registry;
Id : Unsigned_32;
Version : Unsigned_32)
is
P : constant Wl_Thin.Proxy_Ptr :=
Wl_Thin.Registry_Bind (Registry => Registry.My_Registry,
Name => Id,
Interface_V => Wl_Thin.Shm_Interface'Access,
New_Id => Version);
begin
if P /= null then
Shm.My_Shm := P.all'Access;
end if;
end Get_Proxy;
procedure Create_Pool
(Shm : Wayland_Client.Shm;
File_Descriptor : C_Binding.Linux.Files.File;
Size : Integer;
Pool : in out Wayland_Client.Shm_Pool) is
begin
Pool.My_Shm_Pool := Wl_Thin.Shm_Create_Pool
(Shm.My_Shm,
Integer (File_Descriptor.My_File_Descriptor),
Size);
end Create_Pool;
function Get_Version (Shm : Wayland_Client.Shm) return Unsigned_32 is
begin
return Wl_Thin.Shm_Get_Version (Shm.My_Shm);
end Get_Version;
procedure Destroy (Shm : in out Wayland_Client.Shm) is
begin
if Shm.My_Shm /= null then
Wl_Thin.Shm_Destroy (Shm.My_Shm);
Shm.My_Shm := null;
end if;
end Destroy;
procedure Create_Buffer (Pool : Wayland_Client.Shm_Pool;
Offset : Integer;
Width : Integer;
Height : Integer;
Stride : Integer;
Format : Shm_Format;
Buffer : in out Wayland_Client.Buffer) is
begin
Buffer.My_Buffer := Wl_Thin.Shm_Pool_Create_Buffer (Pool.My_Shm_Pool,
Offset,
Width,
Height,
Stride,
Unsigned_32 (Format));
end Create_Buffer;
procedure Resize (Pool : Wayland_Client.Shm_Pool;
Size : Integer) is
begin
Wl_Thin.Shm_Pool_Resize (Pool.My_Shm_Pool, Size);
end Resize;
function Get_Version
(Pool : Wayland_Client.Shm_Pool) return Unsigned_32 is
begin
return Wl_Thin.Shm_Pool_Get_Version (Pool.My_Shm_Pool);
end Get_Version;
procedure Destroy (Pool : in out Wayland_Client.Shm_Pool) is
begin
if Pool.My_Shm_Pool /= null then
Wl_Thin.Shm_Pool_Destroy (Pool.My_Shm_Pool);
Pool.My_Shm_Pool := null;
end if;
end Destroy;
function Get_Version
(Buffer : Wayland_Client.Buffer) return Unsigned_32 is
begin
return Wl_Thin.Buffer_Get_Version (Buffer.My_Buffer);
end Get_Version;
procedure Destroy (Buffer : in out Wayland_Client.Buffer) is
begin
if Buffer.My_Buffer /= null then
Wl_Thin.Buffer_Destroy (Buffer.My_Buffer);
Buffer.My_Buffer := null;
end if;
end Destroy;
function Has_Proxy (Offer : Wayland_Client.Data_Offer) return Boolean is
(Offer.My_Data_Offer /= null);
function Get_Version
(Offer : Wayland_Client.Data_Offer) return Unsigned_32 is
begin
return Wl_Thin.Data_Offer_Get_Version (Offer.My_Data_Offer);
end Get_Version;
procedure Destroy (Offer : in out Wayland_Client.Data_Offer) is
begin
if Offer.My_Data_Offer /= null then
Wl_Thin.Data_Offer_Destroy (Offer.My_Data_Offer);
Offer.My_Data_Offer := null;
end if;
end Destroy;
procedure Do_Accept (Offer : Data_Offer;
Serial : Unsigned_32;
Mime_Type : String) is
begin
Wl_Thin.Proxy_Marshal
(Wl_Thin.Proxy_Ptr'(Offer.My_Data_Offer.all'Access),
WL_DATA_OFFER_ACCEPT,
Serial,
+Mime_Type);
end Do_Accept;
procedure Do_Not_Accept (Offer : Data_Offer;
Serial : Unsigned_32) is
begin
Wl_Thin.Data_Offer_Accept (Offer.My_Data_Offer,
Serial,
Interfaces.C.Strings.Null_Ptr);
end Do_Not_Accept;
procedure Receive (Offer : Data_Offer;
Mime_Type : String;
File_Descriptor : Integer) is
begin
Wl_Thin.Data_Offer_Receive
(Offer.My_Data_Offer, +Mime_Type, File_Descriptor);
end Receive;
procedure Finish (Offer : Data_Offer) is
begin
Wl_Thin.Data_Offer_Finish (Offer.My_Data_Offer);
end Finish;
procedure Set_Actions (Offer : Data_Offer;
Dnd_Actions : Unsigned_32;
Preferred_Action : Unsigned_32) is
begin
Wl_Thin.Data_Offer_Set_Actions (Offer.My_Data_Offer,
Dnd_Actions,
Preferred_Action);
end Set_Actions;
function Get_Version (Surface : Shell_Surface) return Unsigned_32 is
begin
return Wl_Thin.Shell_Surface_Get_Version (Surface.My_Shell_Surface);
end Get_Version;
procedure Destroy (Surface : in out Shell_Surface) is
begin
if Surface.My_Shell_Surface /= null then
Wl_Thin.Shell_Surface_Destroy (Surface.My_Shell_Surface);
Surface.My_Shell_Surface := null;
end if;
end Destroy;
procedure Pong (Surface : Wayland_Client.Shell_Surface;
Serial : Unsigned_32) is
begin
Wl_Thin.Shell_Surface_Pong (Surface.My_Shell_Surface, Serial);
end Pong;
procedure Move (Surface : Shell_Surface;
Seat : Wayland_Client.Seat;
Serial : Unsigned_32) is
begin
Wl_Thin.Shell_Surface_Move (Surface.My_Shell_Surface,
Seat.My_Seat,
Serial);
end Move;
procedure Resize (Surface : Shell_Surface;
Seat : Wayland_Client.Seat;
Serial : Unsigned_32;
Edges : Unsigned_32) is
begin
Wl_Thin.Shell_Surface_Resize (Surface.My_Shell_Surface,
Seat.My_Seat,
Serial,
Edges);
end Resize;
procedure Set_Toplevel (Surface : Wayland_Client.Shell_Surface) is
begin
Wl_Thin.Shell_Surface_Set_Toplevel (Surface.My_Shell_Surface);
end Set_Toplevel;
procedure Set_Transient (Surface : Shell_Surface;
Parent : Wayland_Client.Surface;
X : Integer;
Y : Integer;
Flags : Unsigned_32) is
begin
Wl_Thin.Shell_Surface_Set_Transient (Surface.My_Shell_Surface,
Parent.My_Surface,
X,
Y,
Flags);
end Set_Transient;
procedure Set_Fullscreen (Surface : Shell_Surface;
Method : Unsigned_32;
Framerate : Unsigned_32;
Output : Wayland_Client.Output) is
begin
Wl_Thin.Shell_Surface_Set_Fullscreen (Surface.My_Shell_Surface,
Method,
Framerate,
Output.My_Output);
end Set_Fullscreen;
procedure Set_Popup (Surface : Shell_Surface;
Seat : Wayland_Client.Seat;
Serial : Unsigned_32;
Parent : Wayland_Client.Surface;
X : Integer;
Y : Integer;
Flags : Unsigned_32) is
begin
Wl_Thin.Shell_Surface_Set_Popup (Surface.My_Shell_Surface,
Seat.My_Seat,
Serial,
Parent.My_Surface,
X,
Y,
Flags);
end Set_Popup;
procedure Set_Maximized (Surface : Shell_Surface;
Output : Wayland_Client.Output) is
begin
Wl_Thin.Shell_Surface_Set_Maximized (Surface.My_Shell_Surface,
Output.My_Output);
end Set_Maximized;
procedure Set_Title (Surface : Shell_Surface;
Title : String) is
begin
Wl_Thin.Proxy_Marshal
(Wl_Thin.Proxy_Ptr'(Surface.My_Shell_Surface.all'Access),
WL_SHELL_SURFACE_SET_TITLE,
+Title);
end Set_Title;
procedure Set_Class (Surface : Shell_Surface;
Class_V : String) is
begin
Wl_Thin.Proxy_Marshal
(Wl_Thin.Proxy_Ptr'(Surface.My_Shell_Surface.all'Access),
WL_SHELL_SURFACE_SET_CLASS,
+Class_V);
end Set_Class;
procedure Attach (Surface : Wayland_Client.Surface;
Buffer : Wayland_Client.Buffer;
X : Integer;
Y : Integer) is
begin
Wl_Thin.Surface_Attach (Surface.My_Surface, Buffer.My_Buffer, X, Y);
end Attach;
procedure Damage (Surface : Wayland_Client.Surface;
X : Integer;
Y : Integer;
Width : Integer;
Height : Integer) is
begin
Wl_Thin.Surface_Damage (Surface.My_Surface, X, Y, Width, Height);
end Damage;
function Frame (Surface : Wayland_Client.Surface) return Callback is
begin
return C : Callback do
C.My_Callback := Wl_Thin.Surface_Frame (Surface.My_Surface);
end return;
end Frame;
procedure Set_Opaque_Region (Surface : Wayland_Client.Surface;
Region : Wayland_Client.Region) is
begin
Wl_Thin.Surface_Set_Opaque_Region (Surface.My_Surface,
Region.My_Region);
end Set_Opaque_Region;
procedure Set_Input_Region (Surface : Wayland_Client.Surface;
Region : Wayland_Client.Region) is
begin
Wl_Thin.Surface_Set_Input_Region (Surface.My_Surface,
Region.My_Region);
end Set_Input_Region;
procedure Commit (Surface : Wayland_Client.Surface) is
begin
Wl_Thin.Surface_Commit (Surface.My_Surface);
end Commit;
procedure Set_Buffer_Transform (Surface : Wayland_Client.Surface;
Transform : Integer) is
begin
Wl_Thin.Surface_Set_Buffer_Transform (Surface.My_Surface,
Transform);
end Set_Buffer_Transform;
procedure Set_Buffer_Scale (Surface : Wayland_Client.Surface;
Scale : Integer) is
begin
Wl_Thin.Surface_Set_Buffer_Scale (Surface.My_Surface,
Scale);
end Set_Buffer_Scale;
procedure Damage_Buffer (Surface : Wayland_Client.Surface;
X : Integer;
Y : Integer;
Width : Integer;
Height : Integer) is
begin
Wl_Thin.Surface_Damage_Buffer
(Surface.My_Surface, X, Y, Width, Height);
end Damage_Buffer;
procedure Destroy (Surface : in out Wayland_Client.Surface) is
begin
if Surface.My_Surface /= null then
Wl_Thin.Surface_Destroy (Surface.My_Surface);
Surface.My_Surface := null;
end if;
end Destroy;
function Sync (Display : Wayland_Client.Display) return Callback is
begin
return Callback : Wayland_Client.Callback do
Callback.My_Callback := Wl_Thin.Display_Sync (Display.My_Display);
end return;
end Sync;
function Get_Version
(Registry : Wayland_Client.Registry) return Unsigned_32 is
begin
return Wl_Thin.Registry_Get_Version (Registry.My_Registry);
end Get_Version;
function Has_Proxy (Callback : Wayland_Client.Callback) return Boolean is
(Callback.My_Callback /= null);
procedure Destroy (Callback : in out Wayland_Client.Callback) is
begin
if Callback.My_Callback /= null then
Wl_Thin.Callback_Destroy (Callback.My_Callback);
Callback.My_Callback := null;
end if;
end Destroy;
function Get_Version
(Callback : Wayland_Client.Callback) return Unsigned_32 is
begin
return Wl_Thin.Callback_Get_Version (Callback.My_Callback);
end Get_Version;
function Get_Version
(Pointer : Wayland_Client.Pointer) return Unsigned_32 is
begin
return Wl_Thin.Pointer_Get_Version (Pointer.My_Pointer);
end Get_Version;
procedure Destroy (Pointer : in out Wayland_Client.Pointer) is
begin
if Pointer.My_Pointer /= null then
Wl_Thin.Pointer_Destroy (Pointer.My_Pointer);
Pointer.My_Pointer := null;
end if;
end Destroy;
procedure Set_Cursor (Pointer : Wayland_Client.Pointer;
Serial : Unsigned_32;
Surface : Wayland_Client.Surface;
Hotspot_X : Integer;
Hotspot_Y : Integer) is
begin
Wl_Thin.Pointer_Set_Cursor (Pointer.My_Pointer,
Serial,
Surface.My_Surface,
Hotspot_X,
Hotspot_Y);
end Set_Cursor;
procedure Release (Pointer : in out Wayland_Client.Pointer) is
begin
if Pointer.My_Pointer /= null then
Wl_Thin.Pointer_Release (Pointer.My_Pointer);
Pointer.My_Pointer := null;
end if;
end Release;
function Get_Version
(Keyboard : Wayland_Client.Keyboard) return Unsigned_32 is
begin
return Wl_Thin.Keyboard_Get_Version (Keyboard.My_Keyboard);
end Get_Version;
procedure Destroy (Keyboard : in out Wayland_Client.Keyboard) is
begin
if Keyboard.My_Keyboard /= null then
Wl_Thin.Keyboard_Destroy (Keyboard.My_Keyboard);
Keyboard.My_Keyboard := null;
end if;
end Destroy;
procedure Release (Keyboard : in out Wayland_Client.Keyboard) is
begin
if Keyboard.My_Keyboard /= null then
Wl_Thin.Keyboard_Release (Keyboard.My_Keyboard);
Keyboard.My_Keyboard := null;
end if;
end Release;
function Get_Version (Touch : Wayland_Client.Touch) return Unsigned_32 is
begin
return Wl_Thin.Touch_Get_Version (Touch.My_Touch);
end Get_Version;
procedure Destroy (Touch : in out Wayland_Client.Touch) is
begin
if Touch.My_Touch /= null then
Wl_Thin.Touch_Destroy (Touch.My_Touch);
Touch.My_Touch := null;
end if;
end Destroy;
procedure Release (Touch : in out Wayland_Client.Touch) is
begin
if Touch.My_Touch /= null then
Wl_Thin.Touch_Release (Touch.My_Touch);
Touch.My_Touch := null;
end if;
end Release;
function Get_Version
(Output : Wayland_Client.Output) return Unsigned_32 is
begin
return Wl_Thin.Output_Get_Version (Output.My_Output);
end Get_Version;
procedure Destroy (Output : in out Wayland_Client.Output) is
begin
if Output.My_Output /= null then
Wl_Thin.Output_Destroy (Output.My_Output);
Output.My_Output := null;
end if;
end Destroy;
procedure Release (Output : in out Wayland_Client.Output) is
begin
if Output.My_Output /= null then
Wl_Thin.Output_Release (Output.My_Output);
Output.My_Output := null;
end if;
end Release;
function Get_Version
(Region : Wayland_Client.Region) return Unsigned_32 is
begin
return Wl_Thin.Region_Get_Version (Region.My_Region);
end Get_Version;
procedure Destroy (Region : in out Wayland_Client.Region) is
begin
if Region.My_Region /= null then
Wl_Thin.Region_Destroy (Region.My_Region);
Region.My_Region := null;
end if;
end Destroy;
procedure Add (Region : Wayland_Client.Region;
X : Integer;
Y : Integer;
Width : Integer;
Height : Integer) is
begin
Wl_Thin.Region_Add (Region.My_Region, X, Y, Width, Height);
end Add;
procedure Subtract (Region : Wayland_Client.Region;
X : Integer;
Y : Integer;
Width : Integer;
Height : Integer) is
begin
Wl_Thin.Region_Subtract (Region.My_Region, X, Y, Width, Height);
end Subtract;
function Get_Version
(S : Wayland_Client.Subcompositor) return Unsigned_32 is
begin
return Wl_Thin.Subcompositor_Get_Version (S.My_Subcompositor);
end Get_Version;
procedure Destroy (S : in out Wayland_Client.Subcompositor) is
begin
if S.My_Subcompositor /= null then
Wl_Thin.Subcompositor_Destroy (S.My_Subcompositor);
S.My_Subcompositor := null;
end if;
end Destroy;
procedure Get_Subsurface
(Subcompositor : Wayland_Client.Subcompositor;
Surface : Wayland_Client.Surface;
Parent : Wayland_Client.Surface;
Subsurface : in out Wayland_Client.Subsurface) is
begin
Subsurface.My_Subsurface :=
Wl_Thin.Subcompositor_Get_Subsurface
(Subcompositor.My_Subcompositor,
Surface.My_Surface,
Parent.My_Surface);
end Get_Subsurface;
function Get_Version
(Subsurface : Wayland_Client.Subsurface) return Unsigned_32 is
begin
return Wl_Thin.Subsurface_Get_Version (Subsurface.My_Subsurface);
end Get_Version;
procedure Destroy (Subsurface : in out Wayland_Client.Subsurface) is
begin
if Subsurface.My_Subsurface /= null then
Wl_Thin.Subsurface_Destroy (Subsurface.My_Subsurface);
Subsurface.My_Subsurface := null;
end if;
end Destroy;
procedure Set_Position (Subsurface : Wayland_Client.Subsurface;
X : Integer;
Y : Integer) is
begin
Wl_Thin.Subsurface_Set_Position (Subsurface.My_Subsurface,
X,
Y);
end Set_Position;
procedure Place_Above (Subsurface : Wayland_Client.Subsurface;
Sibling : Wayland_Client.Surface) is
begin
Wl_Thin.Subsurface_Place_Above (Subsurface.My_Subsurface,
Sibling.My_Surface);
end Place_Above;
procedure Place_Below (Subsurface : Wayland_Client.Subsurface;
Sibling : Wayland_Client.Surface) is
begin
Wl_Thin.Subsurface_Place_Below (Subsurface.My_Subsurface,
Sibling.My_Surface);
end Place_Below;
procedure Set_Sync (Subsurface : Wayland_Client.Subsurface) is
begin
Wl_Thin.Subsurface_Set_Sync (Subsurface.My_Subsurface);
end Set_Sync;
procedure Set_Desync (Subsurface : Wayland_Client.Subsurface) is
begin
Wl_Thin.Subsurface_Set_Desync (Subsurface.My_Subsurface);
end Set_Desync;
function Get_Version (Source : Data_Source) return Unsigned_32 is
begin
return Wl_Thin.Data_Source_Get_Version (Source.My_Data_Source);
end Get_Version;
procedure Destroy (Source : in out Data_Source) is
begin
if Source.My_Data_Source /= null then
Wl_Thin.Data_Source_Destroy (Source.My_Data_Source);
Source.My_Data_Source := null;
end if;
end Destroy;
procedure Offer (Source : Data_Source;
Mime_Type : String) is
begin
Wl_Thin.Proxy_Marshal
(Wl_Thin.Proxy_Ptr'(Source.My_Data_Source.all'Access),
WL_DATA_SOURCE_OFFER,
+Mime_Type);
end Offer;
procedure Set_Actions (Source : Data_Source;
Dnd_Actions : Unsigned_32) is
begin
Wl_Thin.Data_Source_Set_Actions (Source.My_Data_Source,
Dnd_Actions);
end Set_Actions;
function Get_Version (Device : Data_Device) return Unsigned_32 is
begin
return Wl_Thin.Data_Device_Get_Version (Device.My_Data_Device);
end Get_Version;
procedure Destroy (Device : in out Data_Device) is
begin
if Device.My_Data_Device /= null then
Wl_Thin.Data_Device_Destroy (Device.My_Data_Device);
Device.My_Data_Device := null;
end if;
end Destroy;
procedure Start_Drag (Device : Data_Device;
Source : Data_Source;
Origin : Surface;
Icon : Surface;
Serial : Unsigned_32) is
begin
Wl_Thin.Data_Device_Start_Drag (Device.My_Data_Device,
Source.My_Data_Source,
Origin.My_Surface,
Icon.My_Surface,
Serial);
end Start_Drag;
procedure Set_Selection (Device : Data_Device;
Source : Data_Source;
Serial : Unsigned_32) is
begin
Wl_Thin.Data_Device_Set_Selection (Device.My_Data_Device,
Source.My_Data_Source,
Serial);
end Set_Selection;
procedure Release (Device : in out Data_Device) is
begin
if Device.My_Data_Device /= null then
Wl_Thin.Data_Device_Release (Device.My_Data_Device);
Device.My_Data_Device := null;
end if;
end Release;
function Get_Version (Manager : Data_Device_Manager) return Unsigned_32 is
begin
return Wl_Thin.Data_Device_Manager_Get_Version
(Manager.My_Data_Device_Manager);
end Get_Version;
procedure Destroy (Manager : in out Data_Device_Manager) is
begin
if Manager.My_Data_Device_Manager /= null then
Wl_Thin.Data_Device_Manager_Destroy (Manager.My_Data_Device_Manager);
Manager.My_Data_Device_Manager := null;
end if;
end Destroy;
procedure Create_Data_Source (Manager : Data_Device_Manager;
Source : in out Data_Source) is
begin
Source.My_Data_Source := Wl_Thin.Data_Device_Manager_Create_Data_Source
(Manager.My_Data_Device_Manager);
end Create_Data_Source;
procedure Get_Data_Device (Manager : Data_Device_Manager;
Seat : Wayland_Client.Seat;
Device : in out Data_Device) is
begin
Device.My_Data_Device := Wl_Thin.Data_Device_Manager_Get_Data_Device
(Manager.My_Data_Device_Manager, Seat.My_Seat);
end Get_Data_Device;
end C_Binding.Linux.Wayland_Client;
|
simonjwright/sdlada | Ada | 5,470 | ads | --------------------------------------------------------------------------------------------------------------------
-- Copyright (c) 2013-2020, Luke A. Guest
--
-- This software is provided 'as-is', without any express or implied
-- warranty. In no event will the authors be held liable for any damages
-- arising from the use of this software.
--
-- Permission is granted to anyone to use this software for any purpose,
-- including commercial applications, and to alter it and redistribute it
-- freely, subject to the following restrictions:
--
-- 1. The origin of this software must not be misrepresented; you must not
-- claim that you wrote the original software. If you use this software
-- in a product, an acknowledgment in the product documentation would be
-- appreciated but is not required.
--
-- 2. Altered source versions must be plainly marked as such, and must not be
-- misrepresented as being the original software.
--
-- 3. This notice may not be removed or altered from any source
-- distribution.
--------------------------------------------------------------------------------------------------------------------
-- SDL
--
-- Ada 2012 bindings to the SDL 2.x.y library.
--------------------------------------------------------------------------------------------------------------------
with Interfaces.C;
package SDL is
pragma Preelaborate;
package C renames Interfaces.C;
use type C.int;
type Init_Flags is mod 2 ** 32 with
Convention => C;
Null_Init_Flags : constant Init_Flags := 16#0000_0000#;
Enable_Timer : constant Init_Flags := 16#0000_0001#;
Enable_Audio : constant Init_Flags := 16#0000_0010#;
Enable_Screen : constant Init_Flags := 16#0000_0020#;
Enable_Joystick : constant Init_Flags := 16#0000_0200#;
Enable_Haptic : constant Init_Flags := 16#0000_1000#;
Enable_Game_Controller : constant Init_Flags := 16#0000_2000#;
Enable_Events : constant Init_Flags := 16#0000_4000#;
Enable_No_Parachute : constant Init_Flags := 16#0010_0000#;
Enable_Everything : constant Init_Flags :=
Enable_Timer or Enable_Audio or Enable_Screen or Enable_Joystick or Enable_Haptic or
Enable_Game_Controller or Enable_Events or Enable_No_Parachute;
-- Coordinates are for positioning things.
subtype Coordinate is C.int;
subtype Natural_Coordinate is Coordinate range 0 .. Coordinate'Last;
subtype Positive_Coordinate is Coordinate range 1 .. Coordinate'Last;
Centre_Coordinate : constant Coordinate := 0;
type Coordinates is
record
X : SDL.Coordinate;
Y : SDL.Coordinate;
end record with
Convention => C;
Zero_Coordinate : constant Coordinates := (others => 0);
subtype Natural_Coordinates is Coordinates with
Dynamic_Predicate =>
Natural_Coordinates.X >= Natural_Coordinate'First and Natural_Coordinates.Y >= Natural_Coordinate'First;
subtype Positive_Coordinates is Coordinates with
Dynamic_Predicate =>
Positive_Coordinates.X >= Positive_Coordinate'First and Positive_Coordinates.Y >= Positive_Coordinate'First;
-- Dimensions are for sizing things.
subtype Dimension is C.int;
subtype Natural_Dimension is Dimension range 0 .. Dimension'Last;
subtype Positive_Dimension is Dimension range 1 .. Dimension'Last;
type Sizes is
record
Width : Dimension;
Height : Dimension;
end record with
Convention => C;
Zero_Size : constant Sizes := (others => Natural_Dimension'First);
subtype Natural_Sizes is Sizes with
Dynamic_Predicate => Natural_Sizes.Width >= 0 and Natural_Sizes.Height >= 0;
subtype Positive_Sizes is Sizes with
Dynamic_Predicate => Positive_Sizes.Width >= 1 and Positive_Sizes.Height >= 1;
function "*" (Left : in Sizes; Scale : in Positive_Dimension) return Sizes is
(Sizes'(Width => Left.Width * Scale, Height => Left.Height * Scale));
function "/" (Left : in Sizes; Scale : in Positive_Dimension) return Sizes is
(Sizes'(Width => Left.Width / Scale, Height => Left.Height / Scale));
function Initialise (Flags : in Init_Flags := Enable_Everything) return Boolean;
procedure Finalise with
Import => True,
Convention => C,
External_Name => "SDL_Quit";
function Initialise_Sub_System (Flags : in Init_Flags) return Boolean;
procedure Finalise_Sub_System
(Flags : in Init_Flags) with
Import => True,
Convention => C,
External_Name => "SDL_QuitSubSystem";
-- Get which sub-systems were initialised.
function Was_Initialised return Init_Flags;
-- Check whether a set of sub-systems were initialised.
function Was_Initialised (Flags : in Init_Flags) return Boolean;
private
Success : constant Interfaces.C.int := 0;
type SDL_Bool is (SDL_False, SDL_True) with
Convention => C;
function To_Bool (Value : in Boolean) return SDL_Bool;
-- The next value is used in mapping the Ada types onto the C types, it is the word size used for all data
-- in SDL, i.e. all data is 4 byte aligned so it works with 32-bit architectures.
Word : constant := 4;
-- These constants are internal to the events system.
SDL_Query : constant C.int := -1;
SDL_Ignore : constant C.int := 0;
SDL_Disable : constant C.int := 0;
SDL_Enable : constant C.int := 1;
end SDL;
|
faelys/natools | Ada | 1,581 | ads | ------------------------------------------------------------------------------
-- Copyright (c) 2014, 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 Natools.S_Expressions.Generic_Caches;
with Natools.Storage_Pools;
package Natools.S_Expressions.Caches is
new Natools.S_Expressions.Generic_Caches
(Natools.Storage_Pools.Access_In_Default_Pool'Storage_Pool,
Natools.Storage_Pools.Access_In_Default_Pool'Storage_Pool,
Natools.Storage_Pools.Access_In_Default_Pool'Storage_Pool);
pragma Preelaborate (Natools.S_Expressions.Caches);
|
zhmu/ananas | Ada | 7,513 | ads | ------------------------------------------------------------------------------
-- --
-- GNAT RUN-TIME COMPONENTS --
-- --
-- S Y S T E M --
-- --
-- S p e c --
-- (GNU-Linux/PPC Version) --
-- --
-- Copyright (C) 1992-2022, Free Software Foundation, Inc. --
-- --
-- This specification is derived from the Ada Reference Manual for use with --
-- GNAT. The copyright notice above, and the license provisions that follow --
-- apply solely to the contents of the part following the private keyword. --
-- --
-- GNAT is free software; you can redistribute it and/or modify it under --
-- terms of the GNU General Public License as published by the Free Soft- --
-- ware Foundation; either version 3, or (at your option) any later ver- --
-- sion. GNAT is distributed in the hope that it will be useful, but WITH- --
-- OUT ANY WARRANTY; without even the implied warranty of MERCHANTABILITY --
-- or FITNESS FOR A PARTICULAR PURPOSE. --
-- --
-- As a special exception under Section 7 of GPL version 3, you are granted --
-- additional permissions described in the GCC Runtime Library Exception, --
-- version 3.1, as published by the Free Software Foundation. --
-- --
-- You should have received a copy of the GNU General Public License and --
-- a copy of the GCC Runtime Library Exception along with this program; --
-- see the files COPYING3 and COPYING.RUNTIME respectively. If not, see --
-- <http://www.gnu.org/licenses/>. --
-- --
-- GNAT was originally developed by the GNAT team at New York University. --
-- Extensive contributions were provided by Ada Core Technologies Inc. --
-- --
------------------------------------------------------------------------------
package System is
pragma Pure;
-- Note that we take advantage of the implementation permission to make
-- this unit Pure instead of Preelaborable; see RM 13.7.1(15). In Ada
-- 2005, this is Pure in any case (AI-362).
pragma No_Elaboration_Code_All;
-- Allow the use of that restriction in units that WITH this unit
type Name is (SYSTEM_NAME_GNAT);
System_Name : constant Name := SYSTEM_NAME_GNAT;
-- System-Dependent Named Numbers
Min_Int : constant := -2 ** (Standard'Max_Integer_Size - 1);
Max_Int : constant := 2 ** (Standard'Max_Integer_Size - 1) - 1;
Max_Binary_Modulus : constant := 2 ** Standard'Max_Integer_Size;
Max_Nonbinary_Modulus : constant := 2 ** Integer'Size - 1;
Max_Base_Digits : constant := Long_Long_Float'Digits;
Max_Digits : constant := Long_Long_Float'Digits;
Max_Mantissa : constant := Standard'Max_Integer_Size - 1;
Fine_Delta : constant := 2.0 ** (-Max_Mantissa);
Tick : constant := 0.000_001;
-- Storage-related Declarations
type Address is private;
pragma Preelaborable_Initialization (Address);
Null_Address : constant Address;
Storage_Unit : constant := 8;
Word_Size : constant := Standard'Word_Size;
Memory_Size : constant := 2 ** Word_Size;
-- Address comparison
function "<" (Left, Right : Address) return Boolean;
function "<=" (Left, Right : Address) return Boolean;
function ">" (Left, Right : Address) return Boolean;
function ">=" (Left, Right : Address) return Boolean;
function "=" (Left, Right : Address) return Boolean;
pragma Import (Intrinsic, "<");
pragma Import (Intrinsic, "<=");
pragma Import (Intrinsic, ">");
pragma Import (Intrinsic, ">=");
pragma Import (Intrinsic, "=");
-- Other System-Dependent Declarations
type Bit_Order is (High_Order_First, Low_Order_First);
Default_Bit_Order : constant Bit_Order :=
Bit_Order'Val (Standard'Default_Bit_Order);
pragma Warnings (Off, Default_Bit_Order); -- kill constant condition warning
-- Priority-related Declarations (RM D.1)
-- 0 .. 98 corresponds to the system priority range 1 .. 99.
--
-- If the scheduling policy is SCHED_FIFO or SCHED_RR the runtime makes use
-- of the entire range provided by the system.
--
-- If the scheduling policy is SCHED_OTHER the only valid system priority
-- is 1 and other values are simply ignored.
Max_Priority : constant Positive := 97;
Max_Interrupt_Priority : constant Positive := 98;
subtype Any_Priority is Integer range 0 .. 98;
subtype Priority is Any_Priority range 0 .. 97;
subtype Interrupt_Priority is Any_Priority range 98 .. 98;
Default_Priority : constant Priority := 48;
private
type Address is mod Memory_Size;
Null_Address : constant Address := 0;
--------------------------------------
-- System Implementation Parameters --
--------------------------------------
-- These parameters provide information about the target that is used
-- by the compiler. They are in the private part of System, where they
-- can be accessed using the special circuitry in the Targparm unit
-- whose source should be consulted for more detailed descriptions
-- of the individual switch values.
Backend_Divide_Checks : constant Boolean := False;
Backend_Overflow_Checks : constant Boolean := True;
Command_Line_Args : constant Boolean := True;
Configurable_Run_Time : constant Boolean := False;
Denorm : constant Boolean := True;
Duration_32_Bits : constant Boolean := False;
Exit_Status_Supported : constant Boolean := True;
Machine_Overflows : constant Boolean := False;
Machine_Rounds : constant Boolean := True;
Preallocated_Stacks : constant Boolean := False;
Signed_Zeros : constant Boolean := True;
Stack_Check_Default : constant Boolean := False;
Stack_Check_Probes : constant Boolean := True;
Stack_Check_Limits : constant Boolean := False;
Support_Aggregates : constant Boolean := True;
Support_Composite_Assign : constant Boolean := True;
Support_Composite_Compare : constant Boolean := True;
Support_Long_Shifts : constant Boolean := True;
Always_Compatible_Rep : constant Boolean := False;
Suppress_Standard_Library : constant Boolean := False;
Use_Ada_Main_Program_Name : constant Boolean := False;
Frontend_Exceptions : constant Boolean := False;
ZCX_By_Default : constant Boolean := True;
end System;
|
reznikmm/matreshka | Ada | 4,575 | 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.Suffix_Attributes is
------------
-- Create --
------------
overriding function Create
(Parameters : not null access Matreshka.DOM_Attributes.Attribute_L2_Parameters)
return Text_Suffix_Attribute_Node is
begin
return Self : Text_Suffix_Attribute_Node do
Matreshka.ODF_Text.Constructors.Initialize
(Self'Unchecked_Access,
Parameters.Document,
Matreshka.ODF_String_Constants.Text_Prefix);
end return;
end Create;
--------------------
-- Get_Local_Name --
--------------------
overriding function Get_Local_Name
(Self : not null access constant Text_Suffix_Attribute_Node)
return League.Strings.Universal_String
is
pragma Unreferenced (Self);
begin
return Matreshka.ODF_String_Constants.Suffix_Attribute;
end Get_Local_Name;
begin
Matreshka.DOM_Documents.Register_Attribute
(Matreshka.ODF_String_Constants.Text_URI,
Matreshka.ODF_String_Constants.Suffix_Attribute,
Text_Suffix_Attribute_Node'Tag);
end Matreshka.ODF_Text.Suffix_Attributes;
|
reznikmm/matreshka | Ada | 4,559 | 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_Anim.Name_Attributes is
------------
-- Create --
------------
overriding function Create
(Parameters : not null access Matreshka.DOM_Attributes.Attribute_L2_Parameters)
return Anim_Name_Attribute_Node is
begin
return Self : Anim_Name_Attribute_Node do
Matreshka.ODF_Anim.Constructors.Initialize
(Self'Unchecked_Access,
Parameters.Document,
Matreshka.ODF_String_Constants.Anim_Prefix);
end return;
end Create;
--------------------
-- Get_Local_Name --
--------------------
overriding function Get_Local_Name
(Self : not null access constant Anim_Name_Attribute_Node)
return League.Strings.Universal_String
is
pragma Unreferenced (Self);
begin
return Matreshka.ODF_String_Constants.Name_Attribute;
end Get_Local_Name;
begin
Matreshka.DOM_Documents.Register_Attribute
(Matreshka.ODF_String_Constants.Anim_URI,
Matreshka.ODF_String_Constants.Name_Attribute,
Anim_Name_Attribute_Node'Tag);
end Matreshka.ODF_Anim.Name_Attributes;
|
reznikmm/matreshka | Ada | 5,609 | adb | ------------------------------------------------------------------------------
-- --
-- Matreshka Project --
-- --
-- XML Processor --
-- --
-- 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 Matreshka.XML_Schema.Visitors;
package body Matreshka.XML_Schema.AST.Particles is
----------------
-- Enter_Node --
----------------
overriding procedure Enter_Node
(Self : not null access Particle_Node;
Visitor : in out Matreshka.XML_Schema.Visitors.Abstract_Visitor'Class;
Control : in out Matreshka.XML_Schema.Visitors.Traverse_Control) is
begin
Visitor.Enter_Particle
(Matreshka.XML_Schema.AST.Particle_Access (Self), Control);
end Enter_Node;
--------------
-- Get_Name --
--------------
overriding function Get_Name
(Self : not null access Particle_Node)
return League.Strings.Universal_String is
begin
return League.Strings.Empty_Universal_String;
end Get_Name;
--------------------------
-- Get_Target_Namespace --
--------------------------
overriding function Get_Target_Namespace
(Self : not null access Particle_Node)
return League.Strings.Universal_String is
begin
return League.Strings.Empty_Universal_String;
end Get_Target_Namespace;
--------------
-- Get_Type --
--------------
overriding function Get_Type
(Self : not null access Particle_Node) return XML.Schema.Component_Type is
begin
return XML.Schema.Particle;
end Get_Type;
----------------
-- Leave_Node --
----------------
overriding procedure Leave_Node
(Self : not null access Particle_Node;
Visitor : in out Matreshka.XML_Schema.Visitors.Abstract_Visitor'Class;
Control : in out Matreshka.XML_Schema.Visitors.Traverse_Control) is
begin
Visitor.Leave_Particle
(Matreshka.XML_Schema.AST.Particle_Access (Self), Control);
end Leave_Node;
----------------
-- Visit_Node --
----------------
overriding procedure Visit_Node
(Self : not null access Particle_Node;
Iterator : in out Matreshka.XML_Schema.Visitors.Abstract_Iterator'Class;
Visitor : in out Matreshka.XML_Schema.Visitors.Abstract_Visitor'Class;
Control : in out Matreshka.XML_Schema.Visitors.Traverse_Control) is
begin
Iterator.Visit_Particle
(Visitor, Matreshka.XML_Schema.AST.Particle_Access (Self), Control);
end Visit_Node;
end Matreshka.XML_Schema.AST.Particles;
|
reznikmm/matreshka | Ada | 14,136 | adb | ------------------------------------------------------------------------------
-- --
-- Matreshka Project --
-- --
-- Ada Modeling Framework --
-- --
-- Runtime Library Component --
-- --
------------------------------------------------------------------------------
-- --
-- Copyright © 2011-2012, Vadim Godunko <[email protected]> --
-- All rights reserved. --
-- --
-- Redistribution and use in source and binary forms, with or without --
-- modification, are permitted provided that the following conditions --
-- are met: --
-- --
-- * Redistributions of source code must retain the above copyright --
-- notice, this list of conditions and the following disclaimer. --
-- --
-- * Redistributions in binary form must reproduce the above copyright --
-- notice, this list of conditions and the following disclaimer in the --
-- documentation and/or other materials provided with the distribution. --
-- --
-- * Neither the name of the Vadim Godunko, IE nor the names of its --
-- contributors may be used to endorse or promote products derived from --
-- this software without specific prior written permission. --
-- --
-- THIS SOFTWARE IS PROVIDED BY THE COPYRIGHT HOLDERS AND CONTRIBUTORS --
-- "AS IS" AND ANY EXPRESS OR IMPLIED WARRANTIES, INCLUDING, BUT NOT --
-- LIMITED TO, THE IMPLIED WARRANTIES OF MERCHANTABILITY AND FITNESS FOR --
-- A PARTICULAR PURPOSE ARE DISCLAIMED. IN NO EVENT SHALL THE COPYRIGHT --
-- HOLDER OR CONTRIBUTORS BE LIABLE FOR ANY DIRECT, INDIRECT, INCIDENTAL, --
-- SPECIAL, EXEMPLARY, OR CONSEQUENTIAL DAMAGES (INCLUDING, BUT NOT LIMITED --
-- TO, PROCUREMENT OF SUBSTITUTE GOODS OR SERVICES; LOSS OF USE, DATA, OR --
-- PROFITS; OR BUSINESS INTERRUPTION) HOWEVER CAUSED AND ON ANY THEORY OF --
-- LIABILITY, WHETHER IN CONTRACT, STRICT LIABILITY, OR TORT (INCLUDING --
-- NEGLIGENCE OR OTHERWISE) ARISING IN ANY WAY OUT OF THE USE OF THIS --
-- SOFTWARE, EVEN IF ADVISED OF THE POSSIBILITY OF SUCH DAMAGE. --
-- --
------------------------------------------------------------------------------
-- $Revision$ $Date$
------------------------------------------------------------------------------
with AMF.Elements;
with AMF.Internals.Element_Collections;
with AMF.Internals.Helpers;
with AMF.Internals.Tables.UML_Attributes;
with AMF.Visitors.UML_Iterators;
with AMF.Visitors.UML_Visitors;
with League.Strings.Internals;
with Matreshka.Internals.Strings;
package body AMF.Internals.UML_Signal_Events is
-------------------
-- Enter_Element --
-------------------
overriding procedure Enter_Element
(Self : not null access constant UML_Signal_Event_Proxy;
Visitor : in out AMF.Visitors.Abstract_Visitor'Class;
Control : in out AMF.Visitors.Traverse_Control) is
begin
if Visitor in AMF.Visitors.UML_Visitors.UML_Visitor'Class then
AMF.Visitors.UML_Visitors.UML_Visitor'Class
(Visitor).Enter_Signal_Event
(AMF.UML.Signal_Events.UML_Signal_Event_Access (Self),
Control);
end if;
end Enter_Element;
-------------------
-- Leave_Element --
-------------------
overriding procedure Leave_Element
(Self : not null access constant UML_Signal_Event_Proxy;
Visitor : in out AMF.Visitors.Abstract_Visitor'Class;
Control : in out AMF.Visitors.Traverse_Control) is
begin
if Visitor in AMF.Visitors.UML_Visitors.UML_Visitor'Class then
AMF.Visitors.UML_Visitors.UML_Visitor'Class
(Visitor).Leave_Signal_Event
(AMF.UML.Signal_Events.UML_Signal_Event_Access (Self),
Control);
end if;
end Leave_Element;
-------------------
-- Visit_Element --
-------------------
overriding procedure Visit_Element
(Self : not null access constant UML_Signal_Event_Proxy;
Iterator : in out AMF.Visitors.Abstract_Iterator'Class;
Visitor : in out AMF.Visitors.Abstract_Visitor'Class;
Control : in out AMF.Visitors.Traverse_Control) is
begin
if Iterator in AMF.Visitors.UML_Iterators.UML_Iterator'Class then
AMF.Visitors.UML_Iterators.UML_Iterator'Class
(Iterator).Visit_Signal_Event
(Visitor,
AMF.UML.Signal_Events.UML_Signal_Event_Access (Self),
Control);
end if;
end Visit_Element;
----------------
-- Get_Signal --
----------------
overriding function Get_Signal
(Self : not null access constant UML_Signal_Event_Proxy)
return AMF.UML.Signals.UML_Signal_Access is
begin
return
AMF.UML.Signals.UML_Signal_Access
(AMF.Internals.Helpers.To_Element
(AMF.Internals.Tables.UML_Attributes.Internal_Get_Signal
(Self.Element)));
end Get_Signal;
----------------
-- Set_Signal --
----------------
overriding procedure Set_Signal
(Self : not null access UML_Signal_Event_Proxy;
To : AMF.UML.Signals.UML_Signal_Access) is
begin
AMF.Internals.Tables.UML_Attributes.Internal_Set_Signal
(Self.Element,
AMF.Internals.Helpers.To_Element
(AMF.Elements.Element_Access (To)));
end Set_Signal;
---------------------------
-- Get_Client_Dependency --
---------------------------
overriding function Get_Client_Dependency
(Self : not null access constant UML_Signal_Event_Proxy)
return AMF.UML.Dependencies.Collections.Set_Of_UML_Dependency is
begin
return
AMF.UML.Dependencies.Collections.Wrap
(AMF.Internals.Element_Collections.Wrap
(AMF.Internals.Tables.UML_Attributes.Internal_Get_Client_Dependency
(Self.Element)));
end Get_Client_Dependency;
-------------------------
-- Get_Name_Expression --
-------------------------
overriding function Get_Name_Expression
(Self : not null access constant UML_Signal_Event_Proxy)
return AMF.UML.String_Expressions.UML_String_Expression_Access is
begin
return
AMF.UML.String_Expressions.UML_String_Expression_Access
(AMF.Internals.Helpers.To_Element
(AMF.Internals.Tables.UML_Attributes.Internal_Get_Name_Expression
(Self.Element)));
end Get_Name_Expression;
-------------------------
-- Set_Name_Expression --
-------------------------
overriding procedure Set_Name_Expression
(Self : not null access UML_Signal_Event_Proxy;
To : AMF.UML.String_Expressions.UML_String_Expression_Access) is
begin
AMF.Internals.Tables.UML_Attributes.Internal_Set_Name_Expression
(Self.Element,
AMF.Internals.Helpers.To_Element
(AMF.Elements.Element_Access (To)));
end Set_Name_Expression;
-------------------
-- Get_Namespace --
-------------------
overriding function Get_Namespace
(Self : not null access constant UML_Signal_Event_Proxy)
return AMF.UML.Namespaces.UML_Namespace_Access is
begin
return
AMF.UML.Namespaces.UML_Namespace_Access
(AMF.Internals.Helpers.To_Element
(AMF.Internals.Tables.UML_Attributes.Internal_Get_Namespace
(Self.Element)));
end Get_Namespace;
------------------------
-- Get_Qualified_Name --
------------------------
overriding function Get_Qualified_Name
(Self : not null access constant UML_Signal_Event_Proxy)
return AMF.Optional_String is
begin
declare
use type Matreshka.Internals.Strings.Shared_String_Access;
Aux : constant Matreshka.Internals.Strings.Shared_String_Access
:= AMF.Internals.Tables.UML_Attributes.Internal_Get_Qualified_Name (Self.Element);
begin
if Aux = null then
return (Is_Empty => True);
else
return (False, League.Strings.Internals.Create (Aux));
end if;
end;
end Get_Qualified_Name;
-----------------------------------
-- Get_Owning_Template_Parameter --
-----------------------------------
overriding function Get_Owning_Template_Parameter
(Self : not null access constant UML_Signal_Event_Proxy)
return AMF.UML.Template_Parameters.UML_Template_Parameter_Access is
begin
return
AMF.UML.Template_Parameters.UML_Template_Parameter_Access
(AMF.Internals.Helpers.To_Element
(AMF.Internals.Tables.UML_Attributes.Internal_Get_Owning_Template_Parameter
(Self.Element)));
end Get_Owning_Template_Parameter;
-----------------------------------
-- Set_Owning_Template_Parameter --
-----------------------------------
overriding procedure Set_Owning_Template_Parameter
(Self : not null access UML_Signal_Event_Proxy;
To : AMF.UML.Template_Parameters.UML_Template_Parameter_Access) is
begin
AMF.Internals.Tables.UML_Attributes.Internal_Set_Owning_Template_Parameter
(Self.Element,
AMF.Internals.Helpers.To_Element
(AMF.Elements.Element_Access (To)));
end Set_Owning_Template_Parameter;
----------------------------
-- Get_Template_Parameter --
----------------------------
overriding function Get_Template_Parameter
(Self : not null access constant UML_Signal_Event_Proxy)
return AMF.UML.Template_Parameters.UML_Template_Parameter_Access is
begin
return
AMF.UML.Template_Parameters.UML_Template_Parameter_Access
(AMF.Internals.Helpers.To_Element
(AMF.Internals.Tables.UML_Attributes.Internal_Get_Template_Parameter
(Self.Element)));
end Get_Template_Parameter;
----------------------------
-- Set_Template_Parameter --
----------------------------
overriding procedure Set_Template_Parameter
(Self : not null access UML_Signal_Event_Proxy;
To : AMF.UML.Template_Parameters.UML_Template_Parameter_Access) is
begin
AMF.Internals.Tables.UML_Attributes.Internal_Set_Template_Parameter
(Self.Element,
AMF.Internals.Helpers.To_Element
(AMF.Elements.Element_Access (To)));
end Set_Template_Parameter;
-------------------------
-- All_Owning_Packages --
-------------------------
overriding function All_Owning_Packages
(Self : not null access constant UML_Signal_Event_Proxy)
return AMF.UML.Packages.Collections.Set_Of_UML_Package is
begin
-- Generated stub: replace with real body!
pragma Compile_Time_Warning (Standard.True, "All_Owning_Packages unimplemented");
raise Program_Error with "Unimplemented procedure UML_Signal_Event_Proxy.All_Owning_Packages";
return All_Owning_Packages (Self);
end All_Owning_Packages;
-----------------------------
-- Is_Distinguishable_From --
-----------------------------
overriding function Is_Distinguishable_From
(Self : not null access constant UML_Signal_Event_Proxy;
N : AMF.UML.Named_Elements.UML_Named_Element_Access;
Ns : AMF.UML.Namespaces.UML_Namespace_Access)
return Boolean is
begin
-- Generated stub: replace with real body!
pragma Compile_Time_Warning (Standard.True, "Is_Distinguishable_From unimplemented");
raise Program_Error with "Unimplemented procedure UML_Signal_Event_Proxy.Is_Distinguishable_From";
return Is_Distinguishable_From (Self, N, Ns);
end Is_Distinguishable_From;
---------------
-- Namespace --
---------------
overriding function Namespace
(Self : not null access constant UML_Signal_Event_Proxy)
return AMF.UML.Namespaces.UML_Namespace_Access is
begin
-- Generated stub: replace with real body!
pragma Compile_Time_Warning (Standard.True, "Namespace unimplemented");
raise Program_Error with "Unimplemented procedure UML_Signal_Event_Proxy.Namespace";
return Namespace (Self);
end Namespace;
------------------------
-- Is_Compatible_With --
------------------------
overriding function Is_Compatible_With
(Self : not null access constant UML_Signal_Event_Proxy;
P : AMF.UML.Parameterable_Elements.UML_Parameterable_Element_Access)
return Boolean is
begin
-- Generated stub: replace with real body!
pragma Compile_Time_Warning (Standard.True, "Is_Compatible_With unimplemented");
raise Program_Error with "Unimplemented procedure UML_Signal_Event_Proxy.Is_Compatible_With";
return Is_Compatible_With (Self, P);
end Is_Compatible_With;
---------------------------
-- Is_Template_Parameter --
---------------------------
overriding function Is_Template_Parameter
(Self : not null access constant UML_Signal_Event_Proxy)
return Boolean is
begin
-- Generated stub: replace with real body!
pragma Compile_Time_Warning (Standard.True, "Is_Template_Parameter unimplemented");
raise Program_Error with "Unimplemented procedure UML_Signal_Event_Proxy.Is_Template_Parameter";
return Is_Template_Parameter (Self);
end Is_Template_Parameter;
end AMF.Internals.UML_Signal_Events;
|
charlie5/cBound | Ada | 1,180 | 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_str_t is
-- Item
--
type Item is record
name_len : aliased Interfaces.Unsigned_8;
end record;
-- Item_Array
--
type Item_Array is
array (Interfaces.C.size_t range <>) of aliased xcb.xcb_str_t.Item;
-- Pointer
--
package C_Pointers is new Interfaces.C.Pointers
(Index => Interfaces.C.size_t,
Element => xcb.xcb_str_t.Item,
Element_Array => xcb.xcb_str_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_str_t.Pointer;
-- Pointer_Pointer
--
package C_Pointer_Pointers is new Interfaces.C.Pointers
(Index => Interfaces.C.size_t,
Element => xcb.xcb_str_t.Pointer,
Element_Array => xcb.xcb_str_t.Pointer_Array,
Default_Terminator => null);
subtype Pointer_Pointer is C_Pointer_Pointers.Pointer;
end xcb.xcb_str_t;
|
reznikmm/matreshka | Ada | 14,910 | adb | ------------------------------------------------------------------------------
-- --
-- Matreshka Project --
-- --
-- Ada Modeling Framework --
-- --
-- Tools 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.Strings.Wide_Wide_Fixed;
with Generator.Arguments;
package body Generator.Units is
use type League.Strings.Universal_String;
---------
-- Add --
---------
procedure Add
(Self : in out Unit; Item : League.Strings.Universal_String) is
begin
if Self.Lines.Is_Empty then
Self.Lines.Append (Item);
else
Self.Lines.Replace
(Self.Lines.Length, Self.Lines.Element (Self.Lines.Length) & Item);
end if;
end Add;
----------------
-- Add_Header --
----------------
procedure Add_Header
(Self : in out Unit;
Name : League.Strings.Universal_String;
Column : Positive)
is
use Ada.Strings.Wide_Wide_Fixed;
Indent : constant Wide_Wide_String := Column * ' ';
Separator : constant Wide_Wide_String
:= Indent & ((Name.Length + 6) * '-');
begin
Self.Add_Line;
Self.Add_Line (+Separator);
Self.Add_Line (Indent & "-- " & Name & " --");
Self.Add_Line (+Separator);
end Add_Header;
--------------
-- Add_Line --
--------------
procedure Add_Line
(Self : in out Unit;
Item : League.Strings.Universal_String
:= League.Strings.Empty_Universal_String) is
begin
Self.Add (Item);
Self.Lines.Append (League.Strings.Empty_Universal_String);
end Add_Line;
----------------------
-- Add_Unit_Comment --
----------------------
procedure Add_Unit_Comment
(Self : in out Unit;
Comment : League.String_Vectors.Universal_String_Vector) is
begin
for J in 1 .. Comment.Length loop
Self.Header_Lines.Append ("-- " & Comment.Element (J));
end loop;
Self.Header_Lines.Append
(+"-------------------------------------------------------------------"
& "-----------");
end Add_Unit_Comment;
---------------------
-- Add_Unit_Header --
---------------------
procedure Add_Unit_Header
(Self : in out Unit;
First_Year : Positive;
Last_Year : Positive)
is
First : constant Positive
:= Integer'Max (First_Year, Generator.Arguments.First_Year);
Last : constant Positive
:= Integer'Max (Last_Year, Generator.Arguments.Last_Year);
begin
Self.Header_Lines.Append
(+"--------------------------------------------------------------------"
& "----------");
Self.Header_Lines.Append
(+"-- "
& " --");
Self.Header_Lines.Append
(+"-- Matreshka Project "
& " --");
Self.Header_Lines.Append
(+"-- "
& " --");
Self.Header_Lines.Append
(+"-- Ada Modeling Framework "
& " --");
Self.Header_Lines.Append
(+"-- "
& " --");
Self.Header_Lines.Append
(+"-- Runtime Library Component "
& " --");
Self.Header_Lines.Append
(+"-- "
& " --");
Self.Header_Lines.Append
(+"--------------------------------------------------------------------"
& "----------");
Self.Header_Lines.Append
(+"-- "
& " --");
if First = Last then
Self.Header_Lines.Append
(+"-- Copyright © "
& Ada.Strings.Wide_Wide_Fixed.Trim
(Integer'Wide_Wide_Image (First), Ada.Strings.Both)
& ", Vadim Godunko <[email protected]> --");
else
Self.Header_Lines.Append
(+"-- Copyright © "
& Ada.Strings.Wide_Wide_Fixed.Trim
(Integer'Wide_Wide_Image (First), Ada.Strings.Both)
& "-"
& Ada.Strings.Wide_Wide_Fixed.Trim
(Integer'Wide_Wide_Image (Last), Ada.Strings.Both)
& ", Vadim Godunko <[email protected]> --");
end if;
Self.Header_Lines.Append
(+"-- All rights reserved. "
& " --");
Self.Header_Lines.Append
(+"-- "
& " --");
Self.Header_Lines.Append
(+"-- Redistribution and use in source and binary forms, with or withou"
& "t --");
Self.Header_Lines.Append
(+"-- modification, are permitted provided that the following condition"
& "s --");
Self.Header_Lines.Append
(+"-- are met: "
& " --");
Self.Header_Lines.Append
(+"-- "
& " --");
Self.Header_Lines.Append
(+"-- * Redistributions of source code must retain the above copyright"
& " --");
Self.Header_Lines.Append
(+"-- notice, this list of conditions and the following disclaimer. "
& " --");
Self.Header_Lines.Append
(+"-- "
& " --");
Self.Header_Lines.Append
(+"-- * Redistributions in binary form must reproduce the above copyri"
& "ght --");
Self.Header_Lines.Append
(+"-- notice, this list of conditions and the following disclaimer i"
& "n the --");
Self.Header_Lines.Append
(+"-- documentation and/or other materials provided with the distrib"
& "ution. --");
Self.Header_Lines.Append
(+"-- "
& " --");
Self.Header_Lines.Append
(+"-- * Neither the name of the Vadim Godunko, IE nor the names of its"
& " --");
Self.Header_Lines.Append
(+"-- contributors may be used to endorse or promote products derive"
& "d from --");
Self.Header_Lines.Append
(+"-- this software without specific prior written permission. "
& " --");
Self.Header_Lines.Append
(+"-- "
& " --");
Self.Header_Lines.Append
(+"-- THIS SOFTWARE IS PROVIDED BY THE COPYRIGHT HOLDERS AND CONTRIBUTO"
& "RS --");
Self.Header_Lines.Append
(+"-- ""AS IS"" AND ANY EXPRESS OR IMPLIED WARRANTIES, INCLUDING, BUT N"
& "OT --");
Self.Header_Lines.Append
(+"-- LIMITED TO, THE IMPLIED WARRANTIES OF MERCHANTABILITY AND FITNESS"
& " FOR --");
Self.Header_Lines.Append
(+"-- A PARTICULAR PURPOSE ARE DISCLAIMED. IN NO EVENT SHALL THE COPYRI"
& "GHT --");
Self.Header_Lines.Append
(+"-- HOLDER OR CONTRIBUTORS BE LIABLE FOR ANY DIRECT, INDIRECT, INCIDE"
& "NTAL, --");
Self.Header_Lines.Append
(+"-- SPECIAL, EXEMPLARY, OR CONSEQUENTIAL DAMAGES (INCLUDING, BUT NOT "
& "LIMITED --");
Self.Header_Lines.Append
(+"-- TO, PROCUREMENT OF SUBSTITUTE GOODS OR SERVICES; LOSS OF USE, DAT"
& "A, OR --");
Self.Header_Lines.Append
(+"-- PROFITS; OR BUSINESS INTERRUPTION) HOWEVER CAUSED AND ON ANY THEO"
& "RY OF --");
Self.Header_Lines.Append
(+"-- LIABILITY, WHETHER IN CONTRACT, STRICT LIABILITY, OR TORT (INCLUD"
& "ING --");
Self.Header_Lines.Append
(+"-- NEGLIGENCE OR OTHERWISE) ARISING IN ANY WAY OUT OF THE USE OF THI"
& "S --");
Self.Header_Lines.Append
(+"-- SOFTWARE, EVEN IF ADVISED OF THE POSSIBILITY OF SUCH DAMAGE. "
& " --");
Self.Header_Lines.Append
(+"-- "
& " --");
Self.Header_Lines.Append
(+"--------------------------------------------------------------------"
& "----------");
Self.Header_Lines.Append
(+"-- $" & "Revision$ $" & "Date$");
Self.Header_Lines.Append
(+"--------------------------------------------------------------------"
& "----------");
Self.Header_Lines.Append
(+"-- This file is generated, don't edit it.");
Self.Header_Lines.Append
(+"--------------------------------------------------------------------"
& "----------");
end Add_Unit_Header;
-------------
-- Context --
-------------
function Context
(Self : in out Unit)
return not null access Generator.Contexts.Context'Class is
begin
return Self.Context'Unchecked_Access;
end Context;
---------
-- Put --
---------
procedure Put
(Self : Unit;
File : Ada.Wide_Wide_Text_IO.File_Type
:= Ada.Wide_Wide_Text_IO.Standard_Output)
is
procedure Put_With_Clause
(Name : League.Strings.Universal_String;
Is_Limited : Boolean;
Is_Private : Boolean);
-- Outputs context clause.
---------------------
-- Put_With_Clause --
---------------------
procedure Put_With_Clause
(Name : League.Strings.Universal_String;
Is_Limited : Boolean;
Is_Private : Boolean) is
begin
if Is_Limited then
Ada.Wide_Wide_Text_IO.Put ("limited ");
elsif Is_Private then
Ada.Wide_Wide_Text_IO.Put ("private ");
end if;
Ada.Wide_Wide_Text_IO.Put ("with ");
Ada.Wide_Wide_Text_IO.Put (Name.To_Wide_Wide_String);
Ada.Wide_Wide_Text_IO.Put_Line (";");
end Put_With_Clause;
begin
for J in 1 .. Self.Header_Lines.Length loop
Ada.Wide_Wide_Text_IO.Put_Line
(Self.Header_Lines.Element (J).To_Wide_Wide_String);
end loop;
Self.Context.Iterate (Put_With_Clause'Access);
for J in 1 .. Self.Lines.Length loop
if J /= Self.Lines.Length
or else not Self.Lines.Element (J).Is_Empty
then
Ada.Wide_Wide_Text_IO.Put_Line
(Self.Lines.Element (J).To_Wide_Wide_String);
end if;
end loop;
end Put;
----------------
-- Set_Column --
----------------
procedure Set_Column (Self : in out Unit; Column : Positive) is
Aux : League.Strings.Universal_String;
begin
if not Self.Lines.Is_Empty then
Aux := Self.Lines.Element (Self.Lines.Length);
end if;
if Aux.Length < Column then
for J in Aux.Length + 1 .. Column - 1 loop
Aux.Append (' ');
end loop;
if Self.Lines.Is_Empty then
Self.Lines.Append (Aux);
else
Self.Lines.Replace (Self.Lines.Length, Aux);
end if;
else
Aux := League.Strings.Empty_Universal_String;
for J in 1 .. Column - 1 loop
Aux.Append (' ');
end loop;
Self.Lines.Append (Aux);
end if;
end Set_Column;
end Generator.Units;
|
onox/orka | Ada | 1,245 | 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 GL.API.Uniforms.UInts is
pragma Preelaborate;
use GL.Types.UInts;
package Uniform1 is new Loader.Procedure_With_3_Params
("glProgramUniform1ui", UInt, Int, UInt);
package Uniform2v is new Loader.Procedure_With_4_Params
("glProgramUniform2uiv", UInt, Int, Size, Vector2_Array);
package Uniform3v is new Loader.Procedure_With_4_Params
("glProgramUniform3uiv", UInt, Int, Size, Vector3_Array);
package Uniform4v is new Loader.Procedure_With_4_Params
("glProgramUniform4uiv", UInt, Int, Size, Vector4_Array);
end GL.API.Uniforms.UInts;
|
stcarrez/ada-util | Ada | 1,391 | ads | -----------------------------------------------------------------------
-- util-commands-tests - Test for commands
-- Copyright (C) 2018, 2022 Stephane Carrez
-- Written by Stephane Carrez ([email protected])
--
-- Licensed under the Apache License, Version 2.0 (the "License");
-- you may not use this file except in compliance with the License.
-- You may obtain a copy of the License at
--
-- http://www.apache.org/licenses/LICENSE-2.0
--
-- Unless required by applicable law or agreed to in writing, software
-- distributed under the License is distributed on an "AS IS" BASIS,
-- WITHOUT WARRANTIES OR CONDITIONS OF ANY KIND, either express or implied.
-- See the License for the specific language governing permissions and
-- limitations under the License.
-----------------------------------------------------------------------
with Util.Tests;
package Util.Commands.Tests is
procedure Add_Tests (Suite : in Util.Tests.Access_Test_Suite);
type Test is new Util.Tests.Test with null record;
-- Tests when the execution of commands.
procedure Test_Execute (T : in out Test);
-- Test execution of help.
procedure Test_Help (T : in out Test);
-- Test usage operation.
procedure Test_Usage (T : in out Test);
-- Test command based on the No_Parser.
procedure Test_Simple_Command (T : in out Test);
end Util.Commands.Tests;
|
stcarrez/ada-css | Ada | 8,143 | adb | -----------------------------------------------------------------------
-- css-analysis-rules-types -- Rules for CSS pre-defined value types
-- Copyright (C) 2017, 2023 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 CSS.Analysis.Rules.Types is
use CSS.Core.Values;
-- ------------------------------
-- Print the rule definition to the print stream.
-- ------------------------------
overriding
procedure Print (Rule : in Builtin_Rule_Type;
Stream : in out CSS.Printer.File_Type'Class) is
begin
Stream.Print (Ada.Strings.Unbounded.To_String (Rule.Name));
end Print;
-- ------------------------------
-- Check if the value represents an integer without unit.
-- ------------------------------
overriding
function Match (Rule : in Integer_Rule_Type;
Value : in CSS.Core.Values.Value_Type) return Boolean is
pragma Unreferenced (Rule);
begin
return Get_Type (Value) = VALUE_NUMBER
and then Get_Unit (Value) = UNIT_NONE;
end Match;
-- ------------------------------
-- Check if the value represents a number or integer without unit.
-- ------------------------------
overriding
function Match (Rule : in Number_Rule_Type;
Value : in CSS.Core.Values.Value_Type) return Boolean is
pragma Unreferenced (Rule);
begin
return Get_Type (Value) = VALUE_NUMBER
and then Get_Unit (Value) = UNIT_NONE;
end Match;
-- ------------------------------
-- Check if the value represents a percentage.
-- ------------------------------
overriding
function Match (Rule : in Percentage_Rule_Type;
Value : in CSS.Core.Values.Value_Type) return Boolean is
pragma Unreferenced (Rule);
begin
return Get_Type (Value) = VALUE_NUMBER
and then Get_Unit (Value) = UNIT_NONE;
end Match;
-- ------------------------------
-- Check if the value represents a length.
-- ------------------------------
overriding
function Match (Rule : in Length_Rule_Type;
Value : in CSS.Core.Values.Value_Type) return Boolean is
pragma Unreferenced (Rule);
begin
if Get_Type (Value) /= VALUE_NUMBER then
return False;
end if;
if Get_Unit (Value) in Length_Unit_Type then
return True;
end if;
if Get_Unit (Value) /= UNIT_NONE then
return False;
end if;
return Get_Value (Value) = "0";
end Match;
-- ------------------------------
-- Check if the value represents a time.
-- ------------------------------
overriding
function Match (Rule : in Time_Rule_Type;
Value : in CSS.Core.Values.Value_Type) return Boolean is
pragma Unreferenced (Rule);
begin
return Get_Type (Value) = VALUE_NUMBER
and then Get_Unit (Value) in Time_Unit_Type;
end Match;
-- ------------------------------
-- Check if the value represents a resolution.
-- ------------------------------
overriding
function Match (Rule : in Resolution_Rule_Type;
Value : in CSS.Core.Values.Value_Type) return Boolean is
pragma Unreferenced (Rule);
begin
return Get_Type (Value) = VALUE_NUMBER
and then Get_Unit (Value) = UNIT_PI;
end Match;
-- ------------------------------
-- Check if the value represents an angle.
-- ------------------------------
overriding
function Match (Rule : in Angle_Rule_Type;
Value : in CSS.Core.Values.Value_Type) return Boolean is
pragma Unreferenced (Rule);
begin
return Get_Type (Value) = VALUE_NUMBER
and then Get_Unit (Value) in Angle_Unit_Type;
end Match;
-- ------------------------------
-- Check if the value represents a string.
-- ------------------------------
overriding
function Match (Rule : in String_Rule_Type;
Value : in CSS.Core.Values.Value_Type) return Boolean is
pragma Unreferenced (Rule);
begin
return Get_Type (Value) = VALUE_STRING;
end Match;
-- ------------------------------
-- Check if the value represents a url.
-- ------------------------------
overriding
function Match (Rule : in URL_Rule_Type;
Value : in CSS.Core.Values.Value_Type) return Boolean is
pragma Unreferenced (Rule);
begin
return Get_Type (Value) = VALUE_URL;
end Match;
-- ------------------------------
-- Check if the value represents an hexadecimal color.
-- ------------------------------
overriding
function Match (Rule : in Color_Rule_Type;
Value : in CSS.Core.Values.Value_Type) return Boolean is
pragma Unreferenced (Rule);
begin
return Get_Type (Value) = VALUE_COLOR;
end Match;
-- ------------------------------
-- Check if the value represents a custom identifier.
-- ------------------------------
overriding
function Match (Rule : in Identifier_Rule_Type;
Value : in CSS.Core.Values.Value_Type) return Boolean is
pragma Unreferenced (Rule);
begin
return Get_Type (Value) = VALUE_IDENT;
end Match;
-- ------------------------------
-- Register the builtin type in the repository.
-- ------------------------------
procedure Register_Builtin (Repository : in out Repository_Type;
Name : in String;
Rule : in Builtin_Rule_Type_Access;
Kind : in CSS.Core.Values.Value_Kind) is
pragma Unreferenced (Kind);
begin
Rule.Name := Ada.Strings.Unbounded.To_Unbounded_String (Name);
Repository.Types.Insert (Name, Rule.all'Access);
end Register_Builtin;
Int_Rule : aliased Types.Integer_Rule_Type;
Percent_Rule : aliased Types.Percentage_Rule_Type;
Length_Rule : aliased Types.Length_Rule_Type;
Number_Rule : aliased Types.Number_Rule_Type;
Angle_Rule : aliased Types.Angle_Rule_Type;
String_Rule : aliased Types.String_Rule_Type;
URL_Rule : aliased Types.URL_Rule_Type;
Color_Rule : aliased Types.Color_Rule_Type;
Ident_Rule : aliased Types.Identifier_Rule_Type;
Resolution_Rule : aliased Types.Resolution_Rule_Type;
Time_Rule : aliased Types.Time_Rule_Type;
procedure Register (Repository : in out Repository_Type) is
begin
Register_Builtin (Repository, "<angle>", Angle_Rule'Access, VALUE_NUMBER);
Register_Builtin (Repository, "<integer>", Int_Rule'Access, VALUE_NUMBER);
Register_Builtin (Repository, "<number>", Number_Rule'Access, VALUE_NUMBER);
Register_Builtin (Repository, "<length>", Length_Rule'Access, VALUE_NUMBER);
Register_Builtin (Repository, "<percentage>", Percent_Rule'Access, VALUE_NUMBER);
Register_Builtin (Repository, "<string>", String_Rule'Access, VALUE_STRING);
Register_Builtin (Repository, "<url>", URL_Rule'Access, VALUE_URL);
Register_Builtin (Repository, "<hex-color>", Color_Rule'Access, VALUE_COLOR);
Register_Builtin (Repository, "<custom-ident>", Ident_Rule'Access, VALUE_IDENT);
Register_Builtin (Repository, "<resolution>", Resolution_Rule'Access, VALUE_NUMBER);
Register_Builtin (Repository, "<time>", Time_Rule'Access, VALUE_NUMBER);
end Register;
end CSS.Analysis.Rules.Types;
|
reznikmm/slimp | Ada | 415 | ads | -- Copyright (c) 2019 Maxim Reznik <[email protected]>
--
-- SPDX-License-Identifier: MIT
-- License-Filename: LICENSE
-------------------------------------------------------------
package Slim.Menu_Commands is
type Menu_Command is limited interface;
type Menu_Command_Access is access all Menu_Command'Class;
not overriding procedure Run (Self : Menu_Command) is abstract;
end Slim.Menu_Commands;
|
ohenley/ada-util | Ada | 8,657 | ads | -----------------------------------------------------------------------
-- util-processes -- Process creation and control
-- Copyright (C) 2011, 2012, 2016 Stephane Carrez
-- Written by Stephane Carrez ([email protected])
--
-- Licensed under the Apache License, Version 2.0 (the "License");
-- you may not use this file except in compliance with the License.
-- You may obtain a copy of the License at
--
-- http://www.apache.org/licenses/LICENSE-2.0
--
-- Unless required by applicable law or agreed to in writing, software
-- distributed under the License is distributed on an "AS IS" BASIS,
-- WITHOUT WARRANTIES OR CONDITIONS OF ANY KIND, either express or implied.
-- See the License for the specific language governing permissions and
-- limitations under the License.
-----------------------------------------------------------------------
with Util.Streams;
with Ada.Finalization;
with Ada.Strings.Unbounded;
package Util.Processes is
Invalid_State : exception;
Process_Error : exception;
-- The optional process pipes:
-- <dl>
-- <dt>NONE</dt>
-- <dd>the process will inherit the standard input, output and error.</dd>
-- <dt>READ</dt>
-- <dd>a pipe is created to read the process standard output.</dd>
-- <dt>READ_ERROR</dt>
-- <dd>a pipe is created to read the process standard error. The output and input are
-- inherited.</dd>
-- <dt>READ_ALL</dt>
-- <dd>similar to READ the same pipe is used for the process standard error.</dd>
-- <dt>WRITE</dt>
-- <dd>a pipe is created to write on the process standard input.</dd>
-- <dt>READ_WRITE</dt>
-- <dd>Combines the <b>READ</b> and <b>WRITE</b> modes.</dd>
-- <dt>READ_WRITE_ALL</dt>
-- <dd>Combines the <b>READ_ALL</b> and <b>WRITE</b> modes.</dd>
-- </dl>
type Pipe_Mode is (NONE, READ, READ_ERROR, READ_ALL, WRITE, READ_WRITE, READ_WRITE_ALL);
subtype String_Access is Ada.Strings.Unbounded.String_Access;
type Argument_List is array (Positive range <>) of String_Access;
type Process_Identifier is new Integer;
-- ------------------------------
-- Process
-- ------------------------------
type Process is limited private;
-- Before launching the process, redirect the input stream of the process
-- to the specified file.
-- Raises <b>Invalid_State</b> if the process is running.
procedure Set_Input_Stream (Proc : in out Process;
File : in String);
-- Set the output stream of the process.
-- Raises <b>Invalid_State</b> if the process is running.
procedure Set_Output_Stream (Proc : in out Process;
File : in String;
Append : in Boolean := False);
-- Set the error stream of the process.
-- Raises <b>Invalid_State</b> if the process is running.
procedure Set_Error_Stream (Proc : in out Process;
File : in String;
Append : in Boolean := False);
-- Set the working directory that the process will use once it is created.
-- The directory must exist or the <b>Invalid_Directory</b> exception will be raised.
procedure Set_Working_Directory (Proc : in out Process;
Path : in String);
-- Set the shell executable path to use to launch a command. The default on Unix is
-- the /bin/sh command. Argument splitting is done by the /bin/sh -c command.
-- When setting an empty shell command, the argument splitting is done by the
-- <tt>Spawn</tt> procedure.
procedure Set_Shell (Proc : in out Process;
Shell : in String);
-- Append the argument to the current process argument list.
-- Raises <b>Invalid_State</b> if the process is running.
procedure Append_Argument (Proc : in out Process;
Arg : in String);
-- Spawn a new process with the given command and its arguments. The standard input, output
-- and error streams are either redirected to a file or to a stream object.
procedure Spawn (Proc : in out Process;
Command : in String;
Arguments : in Argument_List);
procedure Spawn (Proc : in out Process;
Command : in String;
Mode : in Pipe_Mode := NONE);
-- Wait for the process to terminate.
procedure Wait (Proc : in out Process);
-- Terminate the process by sending a signal on Unix and exiting the process on Windows.
-- This operation is not portable and has a different behavior between Unix and Windows.
-- Its intent is to stop the process.
procedure Stop (Proc : in out Process;
Signal : in Positive := 15);
-- Get the process exit status.
function Get_Exit_Status (Proc : in Process) return Integer;
-- Get the process identifier.
function Get_Pid (Proc : in Process) return Process_Identifier;
-- Returns True if the process is running.
function Is_Running (Proc : in Process) return Boolean;
-- Get the process input stream allowing to write on the process standard input.
function Get_Input_Stream (Proc : in Process) return Util.Streams.Output_Stream_Access;
-- Get the process output stream allowing to read the process standard output.
function Get_Output_Stream (Proc : in Process) return Util.Streams.Input_Stream_Access;
-- Get the process error stream allowing to read the process standard output.
function Get_Error_Stream (Proc : in Process) return Util.Streams.Input_Stream_Access;
private
-- The <b>System_Process</b> interface is specific to the system. On Unix, it holds the
-- process identifier. On Windows, more information is necessary, including the process
-- and thread handles. It's a little bit overkill to setup an interface for this but
-- it looks cleaner than having specific system fields here.
type System_Process is limited interface;
type System_Process_Access is access all System_Process'Class;
type Process is new Ada.Finalization.Limited_Controlled with record
Pid : Process_Identifier := -1;
Sys : System_Process_Access := null;
Exit_Value : Integer := -1;
Dir : Ada.Strings.Unbounded.Unbounded_String;
In_File : Ada.Strings.Unbounded.Unbounded_String;
Out_File : Ada.Strings.Unbounded.Unbounded_String;
Err_File : Ada.Strings.Unbounded.Unbounded_String;
Shell : Ada.Strings.Unbounded.Unbounded_String;
Out_Append : Boolean := False;
Err_Append : Boolean := False;
Output : Util.Streams.Input_Stream_Access := null;
Input : Util.Streams.Output_Stream_Access := null;
Error : Util.Streams.Input_Stream_Access := null;
end record;
-- Initialize the process instance.
overriding
procedure Initialize (Proc : in out Process);
-- Deletes the process instance.
overriding
procedure Finalize (Proc : in out Process);
-- Wait for the process to exit.
procedure Wait (Sys : in out System_Process;
Proc : in out Process'Class;
Timeout : in Duration) is abstract;
-- Terminate the process by sending a signal on Unix and exiting the process on Windows.
-- This operation is not portable and has a different behavior between Unix and Windows.
-- Its intent is to stop the process.
procedure Stop (Sys : in out System_Process;
Proc : in out Process'Class;
Signal : in Positive := 15) is abstract;
-- Spawn a new process.
procedure Spawn (Sys : in out System_Process;
Proc : in out Process'Class;
Mode : in Pipe_Mode := NONE) is abstract;
-- Append the argument to the process argument list.
procedure Append_Argument (Sys : in out System_Process;
Arg : in String) is abstract;
-- Set the process input, output and error streams to redirect and use specified files.
procedure Set_Streams (Sys : in out System_Process;
Input : in String;
Output : in String;
Error : in String;
Append_Output : in Boolean;
Append_Error : in Boolean) is abstract;
-- Deletes the storage held by the system process.
procedure Finalize (Sys : in out System_Process) is abstract;
end Util.Processes;
|
zhmu/ananas | Ada | 3,027 | ads | ------------------------------------------------------------------------------
-- --
-- GNAT RUN-TIME COMPONENTS --
-- --
-- S Y S T E M . I M G _ L L I --
-- --
-- S p e c --
-- --
-- Copyright (C) 1992-2022, Free Software Foundation, Inc. --
-- --
-- GNAT is free software; you can redistribute it and/or modify it under --
-- terms of the GNU General Public License as published by the Free Soft- --
-- ware Foundation; either version 3, or (at your option) any later ver- --
-- sion. GNAT is distributed in the hope that it will be useful, but WITH- --
-- OUT ANY WARRANTY; without even the implied warranty of MERCHANTABILITY --
-- or FITNESS FOR A PARTICULAR PURPOSE. --
-- --
-- As a special exception under Section 7 of GPL version 3, you are granted --
-- additional permissions described in the GCC Runtime Library Exception, --
-- version 3.1, as published by the Free Software Foundation. --
-- --
-- You should have received a copy of the GNU General Public License and --
-- a copy of the GCC Runtime Library Exception along with this program; --
-- see the files COPYING3 and COPYING.RUNTIME respectively. If not, see --
-- <http://www.gnu.org/licenses/>. --
-- --
-- GNAT was originally developed by the GNAT team at New York University. --
-- Extensive contributions were provided by Ada Core Technologies Inc. --
-- --
------------------------------------------------------------------------------
-- This package contains the routines for supporting the Image attribute for
-- signed integer types larger than Integer, and also for conversion
-- operations required in Text_IO.Integer_IO for such types.
with System.Image_I;
package System.Img_LLI is
pragma Pure;
package Impl is new Image_I (Long_Long_Integer);
procedure Image_Long_Long_Integer
(V : Long_Long_Integer;
S : in out String;
P : out Natural)
renames Impl.Image_Integer;
procedure Set_Image_Long_Long_Integer
(V : Long_Long_Integer;
S : in out String;
P : in out Natural)
renames Impl.Set_Image_Integer;
end System.Img_LLI;
|
Fabien-Chouteau/Ada_Drivers_Library | Ada | 19,869 | ads | -- Copyright (c) 2013, Nordic Semiconductor ASA
-- All rights reserved.
--
-- Redistribution and use in source and binary forms, with or without
-- modification, are permitted provided that the following conditions are met:
--
-- * 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 Nordic Semiconductor ASA nor the names of its
-- contributors may be used to endorse or promote products derived from
-- this software without specific prior written permission.
--
-- 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 spec has been automatically generated from nrf51.svd
pragma Restrictions (No_Elaboration_Code);
pragma Ada_2012;
pragma Style_Checks (Off);
with HAL;
with System;
package NRF51_SVD.SPIM is
pragma Preelaborate;
---------------
-- Registers --
---------------
-- Enable interrupt on STOPPED event.
type INTENSET_STOPPED_Field is
(
-- Interrupt disabled.
Disabled,
-- Interrupt enabled.
Enabled)
with Size => 1;
for INTENSET_STOPPED_Field use
(Disabled => 0,
Enabled => 1);
-- Enable interrupt on STOPPED event.
type INTENSET_STOPPED_Field_1 is
(
-- Reset value for the field
Intenset_Stopped_Field_Reset,
-- Enable interrupt on write.
Set)
with Size => 1;
for INTENSET_STOPPED_Field_1 use
(Intenset_Stopped_Field_Reset => 0,
Set => 1);
-- Enable interrupt on ENDRX event.
type INTENSET_ENDRX_Field is
(
-- Interrupt disabled.
Disabled,
-- Interrupt enabled.
Enabled)
with Size => 1;
for INTENSET_ENDRX_Field use
(Disabled => 0,
Enabled => 1);
-- Enable interrupt on ENDRX event.
type INTENSET_ENDRX_Field_1 is
(
-- Reset value for the field
Intenset_Endrx_Field_Reset,
-- Enable interrupt on write.
Set)
with Size => 1;
for INTENSET_ENDRX_Field_1 use
(Intenset_Endrx_Field_Reset => 0,
Set => 1);
-- Enable interrupt on ENDTX event.
type INTENSET_ENDTX_Field is
(
-- Interrupt disabled.
Disabled,
-- Interrupt enabled.
Enabled)
with Size => 1;
for INTENSET_ENDTX_Field use
(Disabled => 0,
Enabled => 1);
-- Enable interrupt on ENDTX event.
type INTENSET_ENDTX_Field_1 is
(
-- Reset value for the field
Intenset_Endtx_Field_Reset,
-- Enable interrupt on write.
Set)
with Size => 1;
for INTENSET_ENDTX_Field_1 use
(Intenset_Endtx_Field_Reset => 0,
Set => 1);
-- Enable interrupt on STARTED event.
type INTENSET_STARTED_Field is
(
-- Interrupt disabled.
Disabled,
-- Interrupt enabled.
Enabled)
with Size => 1;
for INTENSET_STARTED_Field use
(Disabled => 0,
Enabled => 1);
-- Enable interrupt on STARTED event.
type INTENSET_STARTED_Field_1 is
(
-- Reset value for the field
Intenset_Started_Field_Reset,
-- Enable interrupt on write.
Set)
with Size => 1;
for INTENSET_STARTED_Field_1 use
(Intenset_Started_Field_Reset => 0,
Set => 1);
-- Interrupt enable set register.
type INTENSET_Register is record
-- unspecified
Reserved_0_0 : HAL.Bit := 16#0#;
-- Enable interrupt on STOPPED event.
STOPPED : INTENSET_STOPPED_Field_1 :=
Intenset_Stopped_Field_Reset;
-- unspecified
Reserved_2_3 : HAL.UInt2 := 16#0#;
-- Enable interrupt on ENDRX event.
ENDRX : INTENSET_ENDRX_Field_1 := Intenset_Endrx_Field_Reset;
-- unspecified
Reserved_5_7 : HAL.UInt3 := 16#0#;
-- Enable interrupt on ENDTX event.
ENDTX : INTENSET_ENDTX_Field_1 := Intenset_Endtx_Field_Reset;
-- unspecified
Reserved_9_18 : HAL.UInt10 := 16#0#;
-- Enable interrupt on STARTED event.
STARTED : INTENSET_STARTED_Field_1 :=
Intenset_Started_Field_Reset;
-- unspecified
Reserved_20_31 : HAL.UInt12 := 16#0#;
end record
with Volatile_Full_Access, Size => 32,
Bit_Order => System.Low_Order_First;
for INTENSET_Register use record
Reserved_0_0 at 0 range 0 .. 0;
STOPPED at 0 range 1 .. 1;
Reserved_2_3 at 0 range 2 .. 3;
ENDRX at 0 range 4 .. 4;
Reserved_5_7 at 0 range 5 .. 7;
ENDTX at 0 range 8 .. 8;
Reserved_9_18 at 0 range 9 .. 18;
STARTED at 0 range 19 .. 19;
Reserved_20_31 at 0 range 20 .. 31;
end record;
-- Disable interrupt on STOPPED event.
type INTENCLR_STOPPED_Field is
(
-- Interrupt disabled.
Disabled,
-- Interrupt enabled.
Enabled)
with Size => 1;
for INTENCLR_STOPPED_Field use
(Disabled => 0,
Enabled => 1);
-- Disable interrupt on STOPPED event.
type INTENCLR_STOPPED_Field_1 is
(
-- Reset value for the field
Intenclr_Stopped_Field_Reset,
-- Disable interrupt on write.
Clear)
with Size => 1;
for INTENCLR_STOPPED_Field_1 use
(Intenclr_Stopped_Field_Reset => 0,
Clear => 1);
-- Disable interrupt on ENDRX event.
type INTENCLR_ENDRX_Field is
(
-- Interrupt disabled.
Disabled,
-- Interrupt enabled.
Enabled)
with Size => 1;
for INTENCLR_ENDRX_Field use
(Disabled => 0,
Enabled => 1);
-- Disable interrupt on ENDRX event.
type INTENCLR_ENDRX_Field_1 is
(
-- Reset value for the field
Intenclr_Endrx_Field_Reset,
-- Disable interrupt on write.
Clear)
with Size => 1;
for INTENCLR_ENDRX_Field_1 use
(Intenclr_Endrx_Field_Reset => 0,
Clear => 1);
-- Disable interrupt on ENDTX event.
type INTENCLR_ENDTX_Field is
(
-- Interrupt disabled.
Disabled,
-- Interrupt enabled.
Enabled)
with Size => 1;
for INTENCLR_ENDTX_Field use
(Disabled => 0,
Enabled => 1);
-- Disable interrupt on ENDTX event.
type INTENCLR_ENDTX_Field_1 is
(
-- Reset value for the field
Intenclr_Endtx_Field_Reset,
-- Disable interrupt on write.
Clear)
with Size => 1;
for INTENCLR_ENDTX_Field_1 use
(Intenclr_Endtx_Field_Reset => 0,
Clear => 1);
-- Disable interrupt on STARTED event.
type INTENCLR_STARTED_Field is
(
-- Interrupt disabled.
Disabled,
-- Interrupt enabled.
Enabled)
with Size => 1;
for INTENCLR_STARTED_Field use
(Disabled => 0,
Enabled => 1);
-- Disable interrupt on STARTED event.
type INTENCLR_STARTED_Field_1 is
(
-- Reset value for the field
Intenclr_Started_Field_Reset,
-- Disable interrupt on write.
Clear)
with Size => 1;
for INTENCLR_STARTED_Field_1 use
(Intenclr_Started_Field_Reset => 0,
Clear => 1);
-- Interrupt enable clear register.
type INTENCLR_Register is record
-- unspecified
Reserved_0_0 : HAL.Bit := 16#0#;
-- Disable interrupt on STOPPED event.
STOPPED : INTENCLR_STOPPED_Field_1 :=
Intenclr_Stopped_Field_Reset;
-- unspecified
Reserved_2_3 : HAL.UInt2 := 16#0#;
-- Disable interrupt on ENDRX event.
ENDRX : INTENCLR_ENDRX_Field_1 := Intenclr_Endrx_Field_Reset;
-- unspecified
Reserved_5_7 : HAL.UInt3 := 16#0#;
-- Disable interrupt on ENDTX event.
ENDTX : INTENCLR_ENDTX_Field_1 := Intenclr_Endtx_Field_Reset;
-- unspecified
Reserved_9_18 : HAL.UInt10 := 16#0#;
-- Disable interrupt on STARTED event.
STARTED : INTENCLR_STARTED_Field_1 :=
Intenclr_Started_Field_Reset;
-- unspecified
Reserved_20_31 : HAL.UInt12 := 16#0#;
end record
with Volatile_Full_Access, Size => 32,
Bit_Order => System.Low_Order_First;
for INTENCLR_Register use record
Reserved_0_0 at 0 range 0 .. 0;
STOPPED at 0 range 1 .. 1;
Reserved_2_3 at 0 range 2 .. 3;
ENDRX at 0 range 4 .. 4;
Reserved_5_7 at 0 range 5 .. 7;
ENDTX at 0 range 8 .. 8;
Reserved_9_18 at 0 range 9 .. 18;
STARTED at 0 range 19 .. 19;
Reserved_20_31 at 0 range 20 .. 31;
end record;
-- Enable or disable SPIM.
type ENABLE_ENABLE_Field is
(
-- Disabled SPIM.
Disabled,
-- Enable SPIM.
Enabled)
with Size => 4;
for ENABLE_ENABLE_Field use
(Disabled => 0,
Enabled => 7);
-- Enable SPIM.
type ENABLE_Register is record
-- Enable or disable SPIM.
ENABLE : ENABLE_ENABLE_Field := NRF51_SVD.SPIM.Disabled;
-- unspecified
Reserved_4_31 : HAL.UInt28 := 16#0#;
end record
with Volatile_Full_Access, Size => 32,
Bit_Order => System.Low_Order_First;
for ENABLE_Register use record
ENABLE at 0 range 0 .. 3;
Reserved_4_31 at 0 range 4 .. 31;
end record;
-----------------------------------
-- SPIM_PSEL cluster's Registers --
-----------------------------------
-- Pin select configuration.
type SPIM_PSEL_Cluster is record
-- Pin select for SCK.
SCK : aliased HAL.UInt32;
-- Pin select for MOSI.
MOSI : aliased HAL.UInt32;
-- Pin select for MISO.
MISO : aliased HAL.UInt32;
end record
with Volatile, Size => 96;
for SPIM_PSEL_Cluster use record
SCK at 16#0# range 0 .. 31;
MOSI at 16#4# range 0 .. 31;
MISO at 16#8# range 0 .. 31;
end record;
----------------------------------
-- SPIM_RXD cluster's Registers --
----------------------------------
subtype MAXCNT_RXD_MAXCNT_Field is HAL.UInt8;
-- Maximum number of buffer bytes to receive.
type MAXCNT_RXD_Register is record
-- Maximum number of buffer bytes to receive.
MAXCNT : MAXCNT_RXD_MAXCNT_Field := 16#0#;
-- unspecified
Reserved_8_31 : HAL.UInt24 := 16#0#;
end record
with Volatile_Full_Access, Size => 32,
Bit_Order => System.Low_Order_First;
for MAXCNT_RXD_Register use record
MAXCNT at 0 range 0 .. 7;
Reserved_8_31 at 0 range 8 .. 31;
end record;
subtype AMOUNT_RXD_AMOUNT_Field is HAL.UInt8;
-- Number of bytes received in the last transaction.
type AMOUNT_RXD_Register is record
-- Read-only. Number of bytes received in the last transaction.
AMOUNT : AMOUNT_RXD_AMOUNT_Field;
-- unspecified
Reserved_8_31 : HAL.UInt24;
end record
with Volatile_Full_Access, Size => 32,
Bit_Order => System.Low_Order_First;
for AMOUNT_RXD_Register use record
AMOUNT at 0 range 0 .. 7;
Reserved_8_31 at 0 range 8 .. 31;
end record;
-- RXD EasyDMA configuration and status.
type SPIM_RXD_Cluster is record
-- Data pointer.
PTR : aliased HAL.UInt32;
-- Maximum number of buffer bytes to receive.
MAXCNT : aliased MAXCNT_RXD_Register;
-- Number of bytes received in the last transaction.
AMOUNT : aliased AMOUNT_RXD_Register;
end record
with Volatile, Size => 96;
for SPIM_RXD_Cluster use record
PTR at 16#0# range 0 .. 31;
MAXCNT at 16#4# range 0 .. 31;
AMOUNT at 16#8# range 0 .. 31;
end record;
----------------------------------
-- SPIM_TXD cluster's Registers --
----------------------------------
subtype MAXCNT_TXD_MAXCNT_Field is HAL.UInt8;
-- Maximum number of buffer bytes to send.
type MAXCNT_TXD_Register is record
-- Maximum number of buffer bytes to send.
MAXCNT : MAXCNT_TXD_MAXCNT_Field := 16#0#;
-- unspecified
Reserved_8_31 : HAL.UInt24 := 16#0#;
end record
with Volatile_Full_Access, Size => 32,
Bit_Order => System.Low_Order_First;
for MAXCNT_TXD_Register use record
MAXCNT at 0 range 0 .. 7;
Reserved_8_31 at 0 range 8 .. 31;
end record;
subtype AMOUNT_TXD_AMOUNT_Field is HAL.UInt8;
-- Number of bytes sent in the last transaction.
type AMOUNT_TXD_Register is record
-- Read-only. Number of bytes sent in the last transaction.
AMOUNT : AMOUNT_TXD_AMOUNT_Field;
-- unspecified
Reserved_8_31 : HAL.UInt24;
end record
with Volatile_Full_Access, Size => 32,
Bit_Order => System.Low_Order_First;
for AMOUNT_TXD_Register use record
AMOUNT at 0 range 0 .. 7;
Reserved_8_31 at 0 range 8 .. 31;
end record;
-- TXD EasyDMA configuration and status.
type SPIM_TXD_Cluster is record
-- Data pointer.
PTR : aliased HAL.UInt32;
-- Maximum number of buffer bytes to send.
MAXCNT : aliased MAXCNT_TXD_Register;
-- Number of bytes sent in the last transaction.
AMOUNT : aliased AMOUNT_TXD_Register;
end record
with Volatile, Size => 96;
for SPIM_TXD_Cluster use record
PTR at 16#0# range 0 .. 31;
MAXCNT at 16#4# range 0 .. 31;
AMOUNT at 16#8# range 0 .. 31;
end record;
-- Bit order.
type CONFIG_ORDER_Field is
(
-- Most significant bit transmitted out first.
Msbfirst,
-- Least significant bit transmitted out first.
Lsbfirst)
with Size => 1;
for CONFIG_ORDER_Field use
(Msbfirst => 0,
Lsbfirst => 1);
-- Serial clock (SCK) phase.
type CONFIG_CPHA_Field is
(
-- Sample on leading edge of the clock. Shift serial data on trailing
-- edge.
Leading,
-- Sample on trailing edge of the clock. Shift serial data on leading
-- edge.
Trailing)
with Size => 1;
for CONFIG_CPHA_Field use
(Leading => 0,
Trailing => 1);
-- Serial clock (SCK) polarity.
type CONFIG_CPOL_Field is
(
-- Active high.
Activehigh,
-- Active low.
Activelow)
with Size => 1;
for CONFIG_CPOL_Field use
(Activehigh => 0,
Activelow => 1);
-- Configuration register.
type CONFIG_Register is record
-- Bit order.
ORDER : CONFIG_ORDER_Field := NRF51_SVD.SPIM.Msbfirst;
-- Serial clock (SCK) phase.
CPHA : CONFIG_CPHA_Field := NRF51_SVD.SPIM.Leading;
-- Serial clock (SCK) polarity.
CPOL : CONFIG_CPOL_Field := NRF51_SVD.SPIM.Activehigh;
-- unspecified
Reserved_3_31 : HAL.UInt29 := 16#0#;
end record
with Volatile_Full_Access, Size => 32,
Bit_Order => System.Low_Order_First;
for CONFIG_Register use record
ORDER at 0 range 0 .. 0;
CPHA at 0 range 1 .. 1;
CPOL at 0 range 2 .. 2;
Reserved_3_31 at 0 range 3 .. 31;
end record;
subtype ORC_ORC_Field is HAL.UInt8;
-- Over-read character.
type ORC_Register is record
-- Over-read character.
ORC : ORC_ORC_Field := 16#0#;
-- unspecified
Reserved_8_31 : HAL.UInt24 := 16#0#;
end record
with Volatile_Full_Access, Size => 32,
Bit_Order => System.Low_Order_First;
for ORC_Register use record
ORC at 0 range 0 .. 7;
Reserved_8_31 at 0 range 8 .. 31;
end record;
-- Peripheral power control.
type POWER_POWER_Field is
(
-- Module power disabled.
Disabled,
-- Module power enabled.
Enabled)
with Size => 1;
for POWER_POWER_Field use
(Disabled => 0,
Enabled => 1);
-- Peripheral power control.
type POWER_Register is record
-- Peripheral power control.
POWER : POWER_POWER_Field := NRF51_SVD.SPIM.Disabled;
-- unspecified
Reserved_1_31 : HAL.UInt31 := 16#0#;
end record
with Volatile_Full_Access, Size => 32,
Bit_Order => System.Low_Order_First;
for POWER_Register use record
POWER at 0 range 0 .. 0;
Reserved_1_31 at 0 range 1 .. 31;
end record;
-----------------
-- Peripherals --
-----------------
-- SPI master with easyDMA 1.
type SPIM_Peripheral is record
-- Start SPI transaction.
TASKS_START : aliased HAL.UInt32;
-- Stop SPI transaction.
TASKS_STOP : aliased HAL.UInt32;
-- Suspend SPI transaction.
TASKS_SUSPEND : aliased HAL.UInt32;
-- Resume SPI transaction.
TASKS_RESUME : aliased HAL.UInt32;
-- SPI transaction has stopped.
EVENTS_STOPPED : aliased HAL.UInt32;
-- End of RXD buffer reached.
EVENTS_ENDRX : aliased HAL.UInt32;
-- End of TXD buffer reached.
EVENTS_ENDTX : aliased HAL.UInt32;
-- Transaction started.
EVENTS_STARTED : aliased HAL.UInt32;
-- Interrupt enable set register.
INTENSET : aliased INTENSET_Register;
-- Interrupt enable clear register.
INTENCLR : aliased INTENCLR_Register;
-- Enable SPIM.
ENABLE : aliased ENABLE_Register;
-- Pin select configuration.
PSEL : aliased SPIM_PSEL_Cluster;
-- SPI frequency.
FREQUENCY : aliased HAL.UInt32;
-- RXD EasyDMA configuration and status.
RXD : aliased SPIM_RXD_Cluster;
-- TXD EasyDMA configuration and status.
TXD : aliased SPIM_TXD_Cluster;
-- Configuration register.
CONFIG : aliased CONFIG_Register;
-- Over-read character.
ORC : aliased ORC_Register;
-- Peripheral power control.
POWER : aliased POWER_Register;
end record
with Volatile;
for SPIM_Peripheral use record
TASKS_START at 16#10# range 0 .. 31;
TASKS_STOP at 16#14# range 0 .. 31;
TASKS_SUSPEND at 16#1C# range 0 .. 31;
TASKS_RESUME at 16#20# range 0 .. 31;
EVENTS_STOPPED at 16#104# range 0 .. 31;
EVENTS_ENDRX at 16#110# range 0 .. 31;
EVENTS_ENDTX at 16#120# range 0 .. 31;
EVENTS_STARTED at 16#14C# range 0 .. 31;
INTENSET at 16#304# range 0 .. 31;
INTENCLR at 16#308# range 0 .. 31;
ENABLE at 16#500# range 0 .. 31;
PSEL at 16#508# range 0 .. 95;
FREQUENCY at 16#524# range 0 .. 31;
RXD at 16#534# range 0 .. 95;
TXD at 16#544# range 0 .. 95;
CONFIG at 16#554# range 0 .. 31;
ORC at 16#5C0# range 0 .. 31;
POWER at 16#FFC# range 0 .. 31;
end record;
-- SPI master with easyDMA 1.
SPIM1_Periph : aliased SPIM_Peripheral
with Import, Address => System'To_Address (16#40004000#);
end NRF51_SVD.SPIM;
|
reznikmm/matreshka | Ada | 4,607 | 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.Note_Class_Attributes is
------------
-- Create --
------------
overriding function Create
(Parameters : not null access Matreshka.DOM_Attributes.Attribute_L2_Parameters)
return Text_Note_Class_Attribute_Node is
begin
return Self : Text_Note_Class_Attribute_Node do
Matreshka.ODF_Text.Constructors.Initialize
(Self'Unchecked_Access,
Parameters.Document,
Matreshka.ODF_String_Constants.Text_Prefix);
end return;
end Create;
--------------------
-- Get_Local_Name --
--------------------
overriding function Get_Local_Name
(Self : not null access constant Text_Note_Class_Attribute_Node)
return League.Strings.Universal_String
is
pragma Unreferenced (Self);
begin
return Matreshka.ODF_String_Constants.Note_Class_Attribute;
end Get_Local_Name;
begin
Matreshka.DOM_Documents.Register_Attribute
(Matreshka.ODF_String_Constants.Text_URI,
Matreshka.ODF_String_Constants.Note_Class_Attribute,
Text_Note_Class_Attribute_Node'Tag);
end Matreshka.ODF_Text.Note_Class_Attributes;
|
reznikmm/matreshka | Ada | 6,960 | 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.Sender_Initials_Elements is
------------
-- Create --
------------
overriding function Create
(Parameters : not null access Matreshka.DOM_Elements.Element_L2_Parameters)
return Text_Sender_Initials_Element_Node is
begin
return Self : Text_Sender_Initials_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_Sender_Initials_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_Sender_Initials
(ODF.DOM.Text_Sender_Initials_Elements.ODF_Text_Sender_Initials_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_Sender_Initials_Element_Node)
return League.Strings.Universal_String
is
pragma Unreferenced (Self);
begin
return Matreshka.ODF_String_Constants.Sender_Initials_Element;
end Get_Local_Name;
----------------
-- Leave_Node --
----------------
overriding procedure Leave_Node
(Self : not null access Text_Sender_Initials_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_Sender_Initials
(ODF.DOM.Text_Sender_Initials_Elements.ODF_Text_Sender_Initials_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_Sender_Initials_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_Sender_Initials
(Visitor,
ODF.DOM.Text_Sender_Initials_Elements.ODF_Text_Sender_Initials_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.Sender_Initials_Element,
Text_Sender_Initials_Element_Node'Tag);
end Matreshka.ODF_Text.Sender_Initials_Elements;
|
rogermc2/OpenGLAda | Ada | 3,964 | ads | -- part of OpenGLAda, (c) 2017 Felix Krause
-- released under the terms of the MIT license, see the file "COPYING"
with Interfaces.C;
private package Glfw.Enums is
type Window_Info is
(Focused, Iconified, Resizable, Visible, Decorated, Auto_Iconify, Floating,
Maximized, Center_Cursor, Transparent_Framebuffer, Hovered, Focus_On_Show,
Red_Bits, Green_Bits, Blue_Bits, Alpha_Bits, Depth_Bits, Stencil_Bits,
Accum_Red_Bits, Accum_Green_Bits, Accum_Blue_Bits, Accum_Alpha_Bits,
Aux_Buffers, Stereo, Samples, SRGB_Capable, Refresh_Rate, Doublebuffer,
Client_API, Context_Version_Major, Context_Version_Minor,
Context_Revision, Context_Robustness, OpenGL_Forward_Compat,
OpenGL_Debug_Context, OpenGL_Profile, Scale_To_Monitor);
for Window_Info use (Focused => 16#20001#,
Iconified => 16#20002#,
Resizable => 16#20003#,
Visible => 16#20004#,
Decorated => 16#20005#,
Auto_Iconify => 16#20006#,
Floating => 16#20007#,
Maximized => 16#20008#,
Center_Cursor => 16#20009#,
Transparent_Framebuffer => 16#2000A#,
Hovered => 16#2000B#,
Focus_On_Show => 16#2000C#,
Red_Bits => 16#21001#,
Green_Bits => 16#21002#,
Blue_Bits => 16#21003#,
Alpha_Bits => 16#21004#,
Depth_Bits => 16#21005#,
Stencil_Bits => 16#21006#,
Accum_Red_Bits => 16#21007#,
Accum_Green_Bits => 16#21008#,
Accum_Blue_Bits => 16#21009#,
Accum_Alpha_Bits => 16#2100A#,
Aux_Buffers => 16#2100B#,
Stereo => 16#2100C#,
Samples => 16#2100D#,
SRGB_Capable => 16#2100E#,
Refresh_Rate => 16#2100F#,
Doublebuffer => 16#21010#,
Client_API => 16#22001#,
Context_Version_Major => 16#22002#,
Context_Version_Minor => 16#22003#,
Context_Revision => 16#22004#,
Context_Robustness => 16#22005#,
OpenGL_Forward_Compat => 16#22006#,
OpenGL_Debug_Context => 16#22007#,
OpenGL_Profile => 16#22008#,
Scale_To_Monitor => 16#2200C#);
for Window_Info'Size use Interfaces.C.int'Size;
type Input_Toggle is (Mouse_Cursor);
for Input_Toggle use (Mouse_Cursor => 16#33001#);
for Input_Toggle'Size use Interfaces.C.int'Size;
type Joystick_ID is (
Joystick_1, Joystick_2, Joystick_3, Joystick_4, Joystick_5,
Joystick_6, Joystick_7, Joystick_8, Joystick_9, Joystick_10,
Joystick_11, Joystick_12, Joystick_13, Joystick_14,
Joystick_15, Joystick_16);
for Joystick_ID use (
Joystick_1 => 0, Joystick_2 => 1, Joystick_3 => 2,
Joystick_4 => 3, Joystick_5 => 4, Joystick_6 => 5,
Joystick_7 => 6, Joystick_8 => 7, Joystick_9 => 8,
Joystick_10 => 9, Joystick_11 => 10, Joystick_12 => 11,
Joystick_13 => 12, Joystick_14 => 13, Joystick_15 => 14,
Joystick_16 => 15
);
for Joystick_ID'Size use Interfaces.C.int'Size;
type Joystick_Param is (Present, Axis, Buttons);
for Joystick_Param use (Present => 16#50001#,
Axis => 16#50002#,
Buttons => 16#50003#);
for Joystick_Param'Size use C.int'Size;
end Glfw.Enums;
|
zhmu/ananas | Ada | 2,794 | ads | ------------------------------------------------------------------------------
-- --
-- GNAT COMPILER COMPONENTS --
-- --
-- S Y S T E M . P R O G R A M _ I N F O --
-- --
-- S p e c --
-- --
-- Copyright (C) 1996-2022, Free Software Foundation, Inc. --
-- --
-- GNAT is free software; you can redistribute it and/or modify it under --
-- terms of the GNU General Public License as published by the Free Soft- --
-- ware Foundation; either version 3, or (at your option) any later ver- --
-- sion. GNAT is distributed in the hope that it will be useful, but WITH- --
-- OUT ANY WARRANTY; without even the implied warranty of MERCHANTABILITY --
-- or FITNESS FOR A PARTICULAR PURPOSE. --
-- --
-- As a special exception under Section 7 of GPL version 3, you are granted --
-- additional permissions described in the GCC Runtime Library Exception, --
-- version 3.1, as published by the Free Software Foundation. --
-- --
-- You should have received a copy of the GNU General Public License and --
-- a copy of the GCC Runtime Library Exception along with this program; --
-- see the files COPYING3 and COPYING.RUNTIME respectively. If not, see --
-- <http://www.gnu.org/licenses/>. --
-- --
-- GNAT was originally developed by the GNAT team at New York University. --
-- Extensive contributions were provided by Ada Core Technologies Inc. --
-- --
------------------------------------------------------------------------------
-- This package contains the definitions and routines used as parameters
-- to the run-time system at program startup.
package System.Program_Info is
pragma Preelaborate;
function Default_Task_Stack return Integer;
-- The default stack size for each created thread. This default value
-- can be overridden on a per-task basis by the language-defined
-- Storage_Size pragma.
end System.Program_Info;
|
stcarrez/ada-css | Ada | 11,086 | ads | -----------------------------------------------------------------------
-- css-parser -- Ada CSS Parser
-- Copyright (C) 2017 Stephane Carrez
-- Written by Stephane Carrez ([email protected])
--
-- Licensed under the Apache License, Version 2.0 (the "License");
-- you may not use this file except in compliance with the License.
-- You may obtain a copy of the License at
--
-- http://www.apache.org/licenses/LICENSE-2.0
--
-- Unless required by applicable law or agreed to in writing, software
-- distributed under the License is distributed on an "AS IS" BASIS,
-- WITHOUT WARRANTIES OR CONDITIONS OF ANY KIND, either express or implied.
-- See the License for the specific language governing permissions and
-- limitations under the License.
-----------------------------------------------------------------------
with Ada.Strings.Unbounded;
with CSS.Core;
with CSS.Core.Sheets;
with CSS.Core.Errors;
private with CSS.Core.Selectors;
private with Util.Concurrent.Counters;
private with CSS.Core.Styles;
private with CSS.Core.Medias;
private with CSS.Core.Values;
private with Ada.Finalization;
package CSS.Parser is
procedure Load (Path : in String;
Sheet : in CSS.Core.Sheets.CSSStylesheet_Access;
Handler : in CSS.Core.Errors.Error_Handler_Access);
-- The parser token or expression.
type YYstype is private;
-- Return a printable representation of the parser token value.
function To_String (Val : in YYstype) return String;
-- Empty token.
EMPTY : constant YYstype;
private
type Node_Type is (TYPE_NULL, TYPE_VALUE, TYPE_NUMBER, TYPE_COLOR,
TYPE_STRING, TYPE_URI, TYPE_IDENT, TYPE_STYLE, TYPE_PROPERTY, TYPE_SELECTOR,
TYPE_SELECTOR_TYPE,
TYPE_PROPERTY_LIST, TYPE_ERROR, TYPE_ADD, TYPE_APPEND);
-- Set the parser token with a string.
-- The line and column number are recorded in the token.
procedure Set_String (Into : in out YYstype;
Value : in String;
Line : in Natural;
Column : in Natural);
-- Append the token as a string.
procedure Append_String (Into : in out YYstype;
Value : in YYstype);
procedure Append_String (Into : in out YYstype;
Value : in String);
procedure Append_String (Into : in out YYstype;
Value1 : in YYstype;
Value2 : in YYstype);
-- Set the parser token with a string that represent an identifier.
-- The line and column number are recorded in the token.
procedure Set_Ident (Into : in out YYstype;
Value : in String;
Line : in Natural;
Column : in Natural);
-- Set the parser token with an number value with an optional unit or dimension.
-- The line and column number are recorded in the token.
procedure Set_Number (Into : in out YYstype;
Value : in String;
Unit : in CSS.Core.Values.Unit_Type;
Line : in Natural;
Column : in Natural);
-- Set the parser token with a url string.
-- The line and column number are recorded in the token.
procedure Set_Uri (Into : in out YYstype;
Value : in String;
Line : in Natural;
Column : in Natural);
-- Set the parser token with a color.
-- Report an error if the color is invalid.
procedure Set_Color (Into : in out YYstype;
Value : in YYstype);
-- Set the parser token to represent a property identifier and its value expression.
-- The value may be a multi-value (ex: 1px 2em 3 4). The priority indicates whether
-- the !important keyword was present.
procedure Set_Property (Into : in out YYstype;
Ident : in YYstype;
Value : in YYstype;
Prio : in Boolean);
-- Set the parser token to represent a list of properties held by a CSSStyleRule
-- declaration. The style rule is created and the first property inserted in it.
-- The stylesheet document is used for the property string allocation.
procedure Set_Property_List (Into : in out YYstype;
Document : in CSS.Core.Sheets.CSSStylesheet_Access;
Prop : in YYstype);
-- Append to the CSSStyleRule the property held by the parser token.
procedure Append_Property (Into : in out CSS.Core.Styles.CSSStyle_Declaration;
Document : in CSS.Core.Sheets.CSSStylesheet_Access;
Prop : in YYstype);
procedure Append_Property (Into : in out CSS.Core.Styles.CSSStyleRule_Access;
Media : in CSS.Core.Medias.CSSMediaRule_Access;
Document : in CSS.Core.Sheets.CSSStylesheet_Access;
Prop : in YYstype);
procedure Append_Media (Into : in out CSS.Core.Medias.CSSMediaRule_Access;
Document : in CSS.Core.Sheets.CSSStylesheet_Access;
List : in YYstype);
-- Set the parser token to represent the CSS selector list.
-- The first selector searched in the document, inserted in the document
-- CSS selector tree and then added to the selector list.
procedure Set_Selector_List (Into : in out YYstype;
Document : in CSS.Core.Sheets.CSSStylesheet_Access;
Selector : in YYstype);
-- Append to the CSS selector list the selector. The selector is first
-- searched in the document CSS selector tree and inserted in the tree.
-- It is then added to the list.
procedure Add_Selector_List (Into : in out CSS.Core.Styles.CSSStyleRule_Access;
Media : in CSS.Core.Medias.CSSMediaRule_Access;
Document : in CSS.Core.Sheets.CSSStylesheet_Access;
Selector : in YYstype);
-- Set the parser token to represent the CSS selector.
procedure Set_Selector (Into : in out YYstype;
Selector : in YYstype);
-- Set the parser token to represent the CSS selector.
procedure Set_Selector (Into : in out YYstype;
Kind : in CSS.Core.Selectors.Selector_Type;
Selector : in YYstype);
-- Set the parser token to represent the CSS selector.
procedure Set_Selector (Into : in out YYstype;
Kind : in CSS.Core.Selectors.Selector_Type;
Param1 : in YYstype;
Param2 : in YYstype);
-- Add to the current parser token CSS selector the next CSS selector.
procedure Add_Selector (Into : in out YYstype;
Selector : in YYstype);
procedure Add_Selector (Into : in out YYstype;
Combinator : in YYstype;
Selector : in YYstype);
-- Add to the parser token CSS selector a filter represented either
-- by an attribute selection, a pseudo element, a pseudo class or
-- a function.
procedure Add_Selector_Filter (Into : in out YYstype;
Filter : in YYstype);
-- Set the parser token to represent a CSS selector type.
-- Record the line and column where the selector type is found.
procedure Set_Selector_Type (Into : in out YYstype;
Selector : in CSS.Core.Selectors.Selector_Type;
Line : in Natural;
Column : in Natural);
procedure Set_Value (Into : in out YYstype;
Document : in CSS.Core.Sheets.CSSStylesheet_Access;
Value : in YYstype);
procedure Set_Expr (Into : in out YYstype;
Left : in YYstype;
Right : in YYstype);
procedure Set_Expr (Into : in out YYstype;
Left : in YYstype;
Oper : in YYstype;
Right : in YYstype);
procedure Set_Function (Into : in out YYstype;
Document : in CSS.Core.Sheets.CSSStylesheet_Access;
Name : in YYstype;
Params : in YYstype);
type Parser_Node_Type;
type Parser_Node_Access is access all Parser_Node_Type;
type Parser_Node_Type (Kind : Node_Type) is limited record
Ref_Counter : Util.Concurrent.Counters.Counter;
case Kind is
when TYPE_STRING | TYPE_IDENT | TYPE_URI | TYPE_NUMBER | TYPE_COLOR =>
Str_Value : Ada.Strings.Unbounded.Unbounded_String;
when TYPE_STYLE =>
Rule : CSS.Core.Styles.CSSStyleRule_Access;
when TYPE_PROPERTY =>
Name : Parser_Node_Access;
Value : Parser_Node_Access;
Prio : Boolean := False;
when TYPE_SELECTOR =>
Selector : CSS.Core.Selectors.CSSSelector;
when TYPE_VALUE =>
V : CSS.Core.Values.Value_Type;
when TYPE_PROPERTY_LIST =>
Values : CSS.Core.Values.Value_List;
when others =>
null;
end case;
end record;
function Create_Value (Document : in CSS.Core.Sheets.CSSStylesheet_Access;
From : in YYstype) return CSS.Core.Values.Value_Type;
function To_String (Val : in Parser_Node_Access) return String;
type YYstype is new Ada.Finalization.Controlled with record
Line : Natural := 0;
Column : Natural := 0;
Unit : CSS.Core.Values.Unit_Type := CSS.Core.Values.UNIT_NONE;
Kind : Node_Type := TYPE_NULL;
Sel : CSS.Core.Selectors.Selector_Type := CSS.Core.Selectors.SEL_CLASS;
Node : Parser_Node_Access;
end record;
overriding
procedure Adjust (Object : in out YYstype);
overriding
procedure Finalize (Object : in out YYstype);
procedure Error (Line : in Natural;
Column : in Natural;
Message : in String);
procedure Warning (Line : in Natural;
Column : in Natural;
Message : in String);
EMPTY : constant YYstype := YYstype '(Ada.Finalization.Controlled with
Line => 0, Column => 0,
Unit => CSS.Core.Values.UNIT_NONE,
Kind => TYPE_NULL,
Sel => CSS.Core.Selectors.SEL_CLASS,
Node => null);
end CSS.Parser;
|
reznikmm/matreshka | Ada | 24,744 | 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.
------------------------------------------------------------------------------
package AMF.Internals.Tables.DG_Metamodel.Objects is
procedure Initialize;
private
procedure Initialize_1 (Extent : AMF.Internals.AMF_Extent);
procedure Initialize_2 (Extent : AMF.Internals.AMF_Extent);
procedure Initialize_3 (Extent : AMF.Internals.AMF_Extent);
procedure Initialize_4 (Extent : AMF.Internals.AMF_Extent);
procedure Initialize_5 (Extent : AMF.Internals.AMF_Extent);
procedure Initialize_6 (Extent : AMF.Internals.AMF_Extent);
procedure Initialize_7 (Extent : AMF.Internals.AMF_Extent);
procedure Initialize_8 (Extent : AMF.Internals.AMF_Extent);
procedure Initialize_9 (Extent : AMF.Internals.AMF_Extent);
procedure Initialize_10 (Extent : AMF.Internals.AMF_Extent);
procedure Initialize_11 (Extent : AMF.Internals.AMF_Extent);
procedure Initialize_12 (Extent : AMF.Internals.AMF_Extent);
procedure Initialize_13 (Extent : AMF.Internals.AMF_Extent);
procedure Initialize_14 (Extent : AMF.Internals.AMF_Extent);
procedure Initialize_15 (Extent : AMF.Internals.AMF_Extent);
procedure Initialize_16 (Extent : AMF.Internals.AMF_Extent);
procedure Initialize_17 (Extent : AMF.Internals.AMF_Extent);
procedure Initialize_18 (Extent : AMF.Internals.AMF_Extent);
procedure Initialize_19 (Extent : AMF.Internals.AMF_Extent);
procedure Initialize_20 (Extent : AMF.Internals.AMF_Extent);
procedure Initialize_21 (Extent : AMF.Internals.AMF_Extent);
procedure Initialize_22 (Extent : AMF.Internals.AMF_Extent);
procedure Initialize_23 (Extent : AMF.Internals.AMF_Extent);
procedure Initialize_24 (Extent : AMF.Internals.AMF_Extent);
procedure Initialize_25 (Extent : AMF.Internals.AMF_Extent);
procedure Initialize_26 (Extent : AMF.Internals.AMF_Extent);
procedure Initialize_27 (Extent : AMF.Internals.AMF_Extent);
procedure Initialize_28 (Extent : AMF.Internals.AMF_Extent);
procedure Initialize_29 (Extent : AMF.Internals.AMF_Extent);
procedure Initialize_30 (Extent : AMF.Internals.AMF_Extent);
procedure Initialize_31 (Extent : AMF.Internals.AMF_Extent);
procedure Initialize_32 (Extent : AMF.Internals.AMF_Extent);
procedure Initialize_33 (Extent : AMF.Internals.AMF_Extent);
procedure Initialize_34 (Extent : AMF.Internals.AMF_Extent);
procedure Initialize_35 (Extent : AMF.Internals.AMF_Extent);
procedure Initialize_36 (Extent : AMF.Internals.AMF_Extent);
procedure Initialize_37 (Extent : AMF.Internals.AMF_Extent);
procedure Initialize_38 (Extent : AMF.Internals.AMF_Extent);
procedure Initialize_39 (Extent : AMF.Internals.AMF_Extent);
procedure Initialize_40 (Extent : AMF.Internals.AMF_Extent);
procedure Initialize_41 (Extent : AMF.Internals.AMF_Extent);
procedure Initialize_42 (Extent : AMF.Internals.AMF_Extent);
procedure Initialize_43 (Extent : AMF.Internals.AMF_Extent);
procedure Initialize_44 (Extent : AMF.Internals.AMF_Extent);
procedure Initialize_45 (Extent : AMF.Internals.AMF_Extent);
procedure Initialize_46 (Extent : AMF.Internals.AMF_Extent);
procedure Initialize_47 (Extent : AMF.Internals.AMF_Extent);
procedure Initialize_48 (Extent : AMF.Internals.AMF_Extent);
procedure Initialize_49 (Extent : AMF.Internals.AMF_Extent);
procedure Initialize_50 (Extent : AMF.Internals.AMF_Extent);
procedure Initialize_51 (Extent : AMF.Internals.AMF_Extent);
procedure Initialize_52 (Extent : AMF.Internals.AMF_Extent);
procedure Initialize_53 (Extent : AMF.Internals.AMF_Extent);
procedure Initialize_54 (Extent : AMF.Internals.AMF_Extent);
procedure Initialize_55 (Extent : AMF.Internals.AMF_Extent);
procedure Initialize_56 (Extent : AMF.Internals.AMF_Extent);
procedure Initialize_57 (Extent : AMF.Internals.AMF_Extent);
procedure Initialize_58 (Extent : AMF.Internals.AMF_Extent);
procedure Initialize_59 (Extent : AMF.Internals.AMF_Extent);
procedure Initialize_60 (Extent : AMF.Internals.AMF_Extent);
procedure Initialize_61 (Extent : AMF.Internals.AMF_Extent);
procedure Initialize_62 (Extent : AMF.Internals.AMF_Extent);
procedure Initialize_63 (Extent : AMF.Internals.AMF_Extent);
procedure Initialize_64 (Extent : AMF.Internals.AMF_Extent);
procedure Initialize_65 (Extent : AMF.Internals.AMF_Extent);
procedure Initialize_66 (Extent : AMF.Internals.AMF_Extent);
procedure Initialize_67 (Extent : AMF.Internals.AMF_Extent);
procedure Initialize_68 (Extent : AMF.Internals.AMF_Extent);
procedure Initialize_69 (Extent : AMF.Internals.AMF_Extent);
procedure Initialize_70 (Extent : AMF.Internals.AMF_Extent);
procedure Initialize_71 (Extent : AMF.Internals.AMF_Extent);
procedure Initialize_72 (Extent : AMF.Internals.AMF_Extent);
procedure Initialize_73 (Extent : AMF.Internals.AMF_Extent);
procedure Initialize_74 (Extent : AMF.Internals.AMF_Extent);
procedure Initialize_75 (Extent : AMF.Internals.AMF_Extent);
procedure Initialize_76 (Extent : AMF.Internals.AMF_Extent);
procedure Initialize_77 (Extent : AMF.Internals.AMF_Extent);
procedure Initialize_78 (Extent : AMF.Internals.AMF_Extent);
procedure Initialize_79 (Extent : AMF.Internals.AMF_Extent);
procedure Initialize_80 (Extent : AMF.Internals.AMF_Extent);
procedure Initialize_81 (Extent : AMF.Internals.AMF_Extent);
procedure Initialize_82 (Extent : AMF.Internals.AMF_Extent);
procedure Initialize_83 (Extent : AMF.Internals.AMF_Extent);
procedure Initialize_84 (Extent : AMF.Internals.AMF_Extent);
procedure Initialize_85 (Extent : AMF.Internals.AMF_Extent);
procedure Initialize_86 (Extent : AMF.Internals.AMF_Extent);
procedure Initialize_87 (Extent : AMF.Internals.AMF_Extent);
procedure Initialize_88 (Extent : AMF.Internals.AMF_Extent);
procedure Initialize_89 (Extent : AMF.Internals.AMF_Extent);
procedure Initialize_90 (Extent : AMF.Internals.AMF_Extent);
procedure Initialize_91 (Extent : AMF.Internals.AMF_Extent);
procedure Initialize_92 (Extent : AMF.Internals.AMF_Extent);
procedure Initialize_93 (Extent : AMF.Internals.AMF_Extent);
procedure Initialize_94 (Extent : AMF.Internals.AMF_Extent);
procedure Initialize_95 (Extent : AMF.Internals.AMF_Extent);
procedure Initialize_96 (Extent : AMF.Internals.AMF_Extent);
procedure Initialize_97 (Extent : AMF.Internals.AMF_Extent);
procedure Initialize_98 (Extent : AMF.Internals.AMF_Extent);
procedure Initialize_99 (Extent : AMF.Internals.AMF_Extent);
procedure Initialize_100 (Extent : AMF.Internals.AMF_Extent);
procedure Initialize_101 (Extent : AMF.Internals.AMF_Extent);
procedure Initialize_102 (Extent : AMF.Internals.AMF_Extent);
procedure Initialize_103 (Extent : AMF.Internals.AMF_Extent);
procedure Initialize_104 (Extent : AMF.Internals.AMF_Extent);
procedure Initialize_105 (Extent : AMF.Internals.AMF_Extent);
procedure Initialize_106 (Extent : AMF.Internals.AMF_Extent);
procedure Initialize_107 (Extent : AMF.Internals.AMF_Extent);
procedure Initialize_108 (Extent : AMF.Internals.AMF_Extent);
procedure Initialize_109 (Extent : AMF.Internals.AMF_Extent);
procedure Initialize_110 (Extent : AMF.Internals.AMF_Extent);
procedure Initialize_111 (Extent : AMF.Internals.AMF_Extent);
procedure Initialize_112 (Extent : AMF.Internals.AMF_Extent);
procedure Initialize_113 (Extent : AMF.Internals.AMF_Extent);
procedure Initialize_114 (Extent : AMF.Internals.AMF_Extent);
procedure Initialize_115 (Extent : AMF.Internals.AMF_Extent);
procedure Initialize_116 (Extent : AMF.Internals.AMF_Extent);
procedure Initialize_117 (Extent : AMF.Internals.AMF_Extent);
procedure Initialize_118 (Extent : AMF.Internals.AMF_Extent);
procedure Initialize_119 (Extent : AMF.Internals.AMF_Extent);
procedure Initialize_120 (Extent : AMF.Internals.AMF_Extent);
procedure Initialize_121 (Extent : AMF.Internals.AMF_Extent);
procedure Initialize_122 (Extent : AMF.Internals.AMF_Extent);
procedure Initialize_123 (Extent : AMF.Internals.AMF_Extent);
procedure Initialize_124 (Extent : AMF.Internals.AMF_Extent);
procedure Initialize_125 (Extent : AMF.Internals.AMF_Extent);
procedure Initialize_126 (Extent : AMF.Internals.AMF_Extent);
procedure Initialize_127 (Extent : AMF.Internals.AMF_Extent);
procedure Initialize_128 (Extent : AMF.Internals.AMF_Extent);
procedure Initialize_129 (Extent : AMF.Internals.AMF_Extent);
procedure Initialize_130 (Extent : AMF.Internals.AMF_Extent);
procedure Initialize_131 (Extent : AMF.Internals.AMF_Extent);
procedure Initialize_132 (Extent : AMF.Internals.AMF_Extent);
procedure Initialize_133 (Extent : AMF.Internals.AMF_Extent);
procedure Initialize_134 (Extent : AMF.Internals.AMF_Extent);
procedure Initialize_135 (Extent : AMF.Internals.AMF_Extent);
procedure Initialize_136 (Extent : AMF.Internals.AMF_Extent);
procedure Initialize_137 (Extent : AMF.Internals.AMF_Extent);
procedure Initialize_138 (Extent : AMF.Internals.AMF_Extent);
procedure Initialize_139 (Extent : AMF.Internals.AMF_Extent);
procedure Initialize_140 (Extent : AMF.Internals.AMF_Extent);
procedure Initialize_141 (Extent : AMF.Internals.AMF_Extent);
procedure Initialize_142 (Extent : AMF.Internals.AMF_Extent);
procedure Initialize_143 (Extent : AMF.Internals.AMF_Extent);
procedure Initialize_144 (Extent : AMF.Internals.AMF_Extent);
procedure Initialize_145 (Extent : AMF.Internals.AMF_Extent);
procedure Initialize_146 (Extent : AMF.Internals.AMF_Extent);
procedure Initialize_147 (Extent : AMF.Internals.AMF_Extent);
procedure Initialize_148 (Extent : AMF.Internals.AMF_Extent);
procedure Initialize_149 (Extent : AMF.Internals.AMF_Extent);
procedure Initialize_150 (Extent : AMF.Internals.AMF_Extent);
procedure Initialize_151 (Extent : AMF.Internals.AMF_Extent);
procedure Initialize_152 (Extent : AMF.Internals.AMF_Extent);
procedure Initialize_153 (Extent : AMF.Internals.AMF_Extent);
procedure Initialize_154 (Extent : AMF.Internals.AMF_Extent);
procedure Initialize_155 (Extent : AMF.Internals.AMF_Extent);
procedure Initialize_156 (Extent : AMF.Internals.AMF_Extent);
procedure Initialize_157 (Extent : AMF.Internals.AMF_Extent);
procedure Initialize_158 (Extent : AMF.Internals.AMF_Extent);
procedure Initialize_159 (Extent : AMF.Internals.AMF_Extent);
procedure Initialize_160 (Extent : AMF.Internals.AMF_Extent);
procedure Initialize_161 (Extent : AMF.Internals.AMF_Extent);
procedure Initialize_162 (Extent : AMF.Internals.AMF_Extent);
procedure Initialize_163 (Extent : AMF.Internals.AMF_Extent);
procedure Initialize_164 (Extent : AMF.Internals.AMF_Extent);
procedure Initialize_165 (Extent : AMF.Internals.AMF_Extent);
procedure Initialize_166 (Extent : AMF.Internals.AMF_Extent);
procedure Initialize_167 (Extent : AMF.Internals.AMF_Extent);
procedure Initialize_168 (Extent : AMF.Internals.AMF_Extent);
procedure Initialize_169 (Extent : AMF.Internals.AMF_Extent);
procedure Initialize_170 (Extent : AMF.Internals.AMF_Extent);
procedure Initialize_171 (Extent : AMF.Internals.AMF_Extent);
procedure Initialize_172 (Extent : AMF.Internals.AMF_Extent);
procedure Initialize_173 (Extent : AMF.Internals.AMF_Extent);
procedure Initialize_174 (Extent : AMF.Internals.AMF_Extent);
procedure Initialize_175 (Extent : AMF.Internals.AMF_Extent);
procedure Initialize_176 (Extent : AMF.Internals.AMF_Extent);
procedure Initialize_177 (Extent : AMF.Internals.AMF_Extent);
procedure Initialize_178 (Extent : AMF.Internals.AMF_Extent);
procedure Initialize_179 (Extent : AMF.Internals.AMF_Extent);
procedure Initialize_180 (Extent : AMF.Internals.AMF_Extent);
procedure Initialize_181 (Extent : AMF.Internals.AMF_Extent);
procedure Initialize_182 (Extent : AMF.Internals.AMF_Extent);
procedure Initialize_183 (Extent : AMF.Internals.AMF_Extent);
procedure Initialize_184 (Extent : AMF.Internals.AMF_Extent);
procedure Initialize_185 (Extent : AMF.Internals.AMF_Extent);
procedure Initialize_186 (Extent : AMF.Internals.AMF_Extent);
procedure Initialize_187 (Extent : AMF.Internals.AMF_Extent);
procedure Initialize_188 (Extent : AMF.Internals.AMF_Extent);
procedure Initialize_189 (Extent : AMF.Internals.AMF_Extent);
procedure Initialize_190 (Extent : AMF.Internals.AMF_Extent);
procedure Initialize_191 (Extent : AMF.Internals.AMF_Extent);
procedure Initialize_192 (Extent : AMF.Internals.AMF_Extent);
procedure Initialize_193 (Extent : AMF.Internals.AMF_Extent);
procedure Initialize_194 (Extent : AMF.Internals.AMF_Extent);
procedure Initialize_195 (Extent : AMF.Internals.AMF_Extent);
procedure Initialize_196 (Extent : AMF.Internals.AMF_Extent);
procedure Initialize_197 (Extent : AMF.Internals.AMF_Extent);
procedure Initialize_198 (Extent : AMF.Internals.AMF_Extent);
procedure Initialize_199 (Extent : AMF.Internals.AMF_Extent);
procedure Initialize_200 (Extent : AMF.Internals.AMF_Extent);
procedure Initialize_201 (Extent : AMF.Internals.AMF_Extent);
procedure Initialize_202 (Extent : AMF.Internals.AMF_Extent);
procedure Initialize_203 (Extent : AMF.Internals.AMF_Extent);
procedure Initialize_204 (Extent : AMF.Internals.AMF_Extent);
procedure Initialize_205 (Extent : AMF.Internals.AMF_Extent);
procedure Initialize_206 (Extent : AMF.Internals.AMF_Extent);
procedure Initialize_207 (Extent : AMF.Internals.AMF_Extent);
procedure Initialize_208 (Extent : AMF.Internals.AMF_Extent);
procedure Initialize_209 (Extent : AMF.Internals.AMF_Extent);
procedure Initialize_210 (Extent : AMF.Internals.AMF_Extent);
procedure Initialize_211 (Extent : AMF.Internals.AMF_Extent);
procedure Initialize_212 (Extent : AMF.Internals.AMF_Extent);
procedure Initialize_213 (Extent : AMF.Internals.AMF_Extent);
procedure Initialize_214 (Extent : AMF.Internals.AMF_Extent);
procedure Initialize_215 (Extent : AMF.Internals.AMF_Extent);
procedure Initialize_216 (Extent : AMF.Internals.AMF_Extent);
procedure Initialize_217 (Extent : AMF.Internals.AMF_Extent);
procedure Initialize_218 (Extent : AMF.Internals.AMF_Extent);
procedure Initialize_219 (Extent : AMF.Internals.AMF_Extent);
procedure Initialize_220 (Extent : AMF.Internals.AMF_Extent);
procedure Initialize_221 (Extent : AMF.Internals.AMF_Extent);
procedure Initialize_222 (Extent : AMF.Internals.AMF_Extent);
procedure Initialize_223 (Extent : AMF.Internals.AMF_Extent);
procedure Initialize_224 (Extent : AMF.Internals.AMF_Extent);
procedure Initialize_225 (Extent : AMF.Internals.AMF_Extent);
procedure Initialize_226 (Extent : AMF.Internals.AMF_Extent);
procedure Initialize_227 (Extent : AMF.Internals.AMF_Extent);
procedure Initialize_228 (Extent : AMF.Internals.AMF_Extent);
procedure Initialize_229 (Extent : AMF.Internals.AMF_Extent);
procedure Initialize_230 (Extent : AMF.Internals.AMF_Extent);
procedure Initialize_231 (Extent : AMF.Internals.AMF_Extent);
procedure Initialize_232 (Extent : AMF.Internals.AMF_Extent);
procedure Initialize_233 (Extent : AMF.Internals.AMF_Extent);
procedure Initialize_234 (Extent : AMF.Internals.AMF_Extent);
procedure Initialize_235 (Extent : AMF.Internals.AMF_Extent);
procedure Initialize_236 (Extent : AMF.Internals.AMF_Extent);
procedure Initialize_237 (Extent : AMF.Internals.AMF_Extent);
procedure Initialize_238 (Extent : AMF.Internals.AMF_Extent);
procedure Initialize_239 (Extent : AMF.Internals.AMF_Extent);
procedure Initialize_240 (Extent : AMF.Internals.AMF_Extent);
procedure Initialize_241 (Extent : AMF.Internals.AMF_Extent);
procedure Initialize_242 (Extent : AMF.Internals.AMF_Extent);
procedure Initialize_243 (Extent : AMF.Internals.AMF_Extent);
procedure Initialize_244 (Extent : AMF.Internals.AMF_Extent);
procedure Initialize_245 (Extent : AMF.Internals.AMF_Extent);
procedure Initialize_246 (Extent : AMF.Internals.AMF_Extent);
procedure Initialize_247 (Extent : AMF.Internals.AMF_Extent);
procedure Initialize_248 (Extent : AMF.Internals.AMF_Extent);
procedure Initialize_249 (Extent : AMF.Internals.AMF_Extent);
procedure Initialize_250 (Extent : AMF.Internals.AMF_Extent);
procedure Initialize_251 (Extent : AMF.Internals.AMF_Extent);
procedure Initialize_252 (Extent : AMF.Internals.AMF_Extent);
procedure Initialize_253 (Extent : AMF.Internals.AMF_Extent);
procedure Initialize_254 (Extent : AMF.Internals.AMF_Extent);
procedure Initialize_255 (Extent : AMF.Internals.AMF_Extent);
procedure Initialize_256 (Extent : AMF.Internals.AMF_Extent);
procedure Initialize_257 (Extent : AMF.Internals.AMF_Extent);
procedure Initialize_258 (Extent : AMF.Internals.AMF_Extent);
procedure Initialize_259 (Extent : AMF.Internals.AMF_Extent);
procedure Initialize_260 (Extent : AMF.Internals.AMF_Extent);
procedure Initialize_261 (Extent : AMF.Internals.AMF_Extent);
procedure Initialize_262 (Extent : AMF.Internals.AMF_Extent);
procedure Initialize_263 (Extent : AMF.Internals.AMF_Extent);
procedure Initialize_264 (Extent : AMF.Internals.AMF_Extent);
procedure Initialize_265 (Extent : AMF.Internals.AMF_Extent);
procedure Initialize_266 (Extent : AMF.Internals.AMF_Extent);
procedure Initialize_267 (Extent : AMF.Internals.AMF_Extent);
procedure Initialize_268 (Extent : AMF.Internals.AMF_Extent);
procedure Initialize_269 (Extent : AMF.Internals.AMF_Extent);
procedure Initialize_270 (Extent : AMF.Internals.AMF_Extent);
procedure Initialize_271 (Extent : AMF.Internals.AMF_Extent);
procedure Initialize_272 (Extent : AMF.Internals.AMF_Extent);
procedure Initialize_273 (Extent : AMF.Internals.AMF_Extent);
procedure Initialize_274 (Extent : AMF.Internals.AMF_Extent);
procedure Initialize_275 (Extent : AMF.Internals.AMF_Extent);
procedure Initialize_276 (Extent : AMF.Internals.AMF_Extent);
procedure Initialize_277 (Extent : AMF.Internals.AMF_Extent);
procedure Initialize_278 (Extent : AMF.Internals.AMF_Extent);
procedure Initialize_279 (Extent : AMF.Internals.AMF_Extent);
procedure Initialize_280 (Extent : AMF.Internals.AMF_Extent);
procedure Initialize_281 (Extent : AMF.Internals.AMF_Extent);
procedure Initialize_282 (Extent : AMF.Internals.AMF_Extent);
procedure Initialize_283 (Extent : AMF.Internals.AMF_Extent);
procedure Initialize_284 (Extent : AMF.Internals.AMF_Extent);
procedure Initialize_285 (Extent : AMF.Internals.AMF_Extent);
procedure Initialize_286 (Extent : AMF.Internals.AMF_Extent);
procedure Initialize_287 (Extent : AMF.Internals.AMF_Extent);
procedure Initialize_288 (Extent : AMF.Internals.AMF_Extent);
procedure Initialize_289 (Extent : AMF.Internals.AMF_Extent);
procedure Initialize_290 (Extent : AMF.Internals.AMF_Extent);
procedure Initialize_291 (Extent : AMF.Internals.AMF_Extent);
procedure Initialize_292 (Extent : AMF.Internals.AMF_Extent);
procedure Initialize_293 (Extent : AMF.Internals.AMF_Extent);
procedure Initialize_294 (Extent : AMF.Internals.AMF_Extent);
procedure Initialize_295 (Extent : AMF.Internals.AMF_Extent);
procedure Initialize_296 (Extent : AMF.Internals.AMF_Extent);
procedure Initialize_297 (Extent : AMF.Internals.AMF_Extent);
procedure Initialize_298 (Extent : AMF.Internals.AMF_Extent);
procedure Initialize_299 (Extent : AMF.Internals.AMF_Extent);
procedure Initialize_300 (Extent : AMF.Internals.AMF_Extent);
procedure Initialize_301 (Extent : AMF.Internals.AMF_Extent);
procedure Initialize_302 (Extent : AMF.Internals.AMF_Extent);
procedure Initialize_303 (Extent : AMF.Internals.AMF_Extent);
procedure Initialize_304 (Extent : AMF.Internals.AMF_Extent);
procedure Initialize_305 (Extent : AMF.Internals.AMF_Extent);
procedure Initialize_306 (Extent : AMF.Internals.AMF_Extent);
procedure Initialize_307 (Extent : AMF.Internals.AMF_Extent);
procedure Initialize_308 (Extent : AMF.Internals.AMF_Extent);
procedure Initialize_309 (Extent : AMF.Internals.AMF_Extent);
procedure Initialize_310 (Extent : AMF.Internals.AMF_Extent);
procedure Initialize_311 (Extent : AMF.Internals.AMF_Extent);
procedure Initialize_312 (Extent : AMF.Internals.AMF_Extent);
procedure Initialize_313 (Extent : AMF.Internals.AMF_Extent);
procedure Initialize_314 (Extent : AMF.Internals.AMF_Extent);
procedure Initialize_315 (Extent : AMF.Internals.AMF_Extent);
procedure Initialize_316 (Extent : AMF.Internals.AMF_Extent);
procedure Initialize_317 (Extent : AMF.Internals.AMF_Extent);
procedure Initialize_318 (Extent : AMF.Internals.AMF_Extent);
procedure Initialize_319 (Extent : AMF.Internals.AMF_Extent);
procedure Initialize_320 (Extent : AMF.Internals.AMF_Extent);
procedure Initialize_321 (Extent : AMF.Internals.AMF_Extent);
procedure Initialize_322 (Extent : AMF.Internals.AMF_Extent);
end AMF.Internals.Tables.DG_Metamodel.Objects;
|
reznikmm/matreshka | Ada | 125,494 | ads | ------------------------------------------------------------------------------
-- --
-- Matreshka Project --
-- --
-- XML Processor --
-- --
-- Runtime Library Component --
-- --
------------------------------------------------------------------------------
-- --
-- Copyright © 2010-2012, Vadim Godunko <[email protected]> --
-- All rights reserved. --
-- --
-- Redistribution and use in source and binary forms, with or without --
-- modification, are permitted provided that the following conditions --
-- are met: --
-- --
-- * Redistributions of source code must retain the above copyright --
-- notice, this list of conditions and the following disclaimer. --
-- --
-- * Redistributions in binary form must reproduce the above copyright --
-- notice, this list of conditions and the following disclaimer in the --
-- documentation and/or other materials provided with the distribution. --
-- --
-- * Neither the name of the Vadim Godunko, IE nor the names of its --
-- contributors may be used to endorse or promote products derived from --
-- this software without specific prior written permission. --
-- --
-- THIS SOFTWARE IS PROVIDED BY THE COPYRIGHT HOLDERS AND CONTRIBUTORS --
-- "AS IS" AND ANY EXPRESS OR IMPLIED WARRANTIES, INCLUDING, BUT NOT --
-- LIMITED TO, THE IMPLIED WARRANTIES OF MERCHANTABILITY AND FITNESS FOR --
-- A PARTICULAR PURPOSE ARE DISCLAIMED. IN NO EVENT SHALL THE COPYRIGHT --
-- HOLDER OR CONTRIBUTORS BE LIABLE FOR ANY DIRECT, INDIRECT, INCIDENTAL, --
-- SPECIAL, EXEMPLARY, OR CONSEQUENTIAL DAMAGES (INCLUDING, BUT NOT LIMITED --
-- TO, PROCUREMENT OF SUBSTITUTE GOODS OR SERVICES; LOSS OF USE, DATA, OR --
-- PROFITS; OR BUSINESS INTERRUPTION) HOWEVER CAUSED AND ON ANY THEORY OF --
-- LIABILITY, WHETHER IN CONTRACT, STRICT LIABILITY, OR TORT (INCLUDING --
-- NEGLIGENCE OR OTHERWISE) ARISING IN ANY WAY OUT OF THE USE OF THIS --
-- SOFTWARE, EVEN IF ADVISED OF THE POSSIBILITY OF SUCH DAMAGE. --
-- --
------------------------------------------------------------------------------
-- $Revision$ $Date$
------------------------------------------------------------------------------
pragma Style_Checks ("-t");
-- GNAT: Disable check for token separation rules, because format of the
-- tables is not compatible with them.
with Matreshka.Internals.Unicode;
private package XML.SAX.Simple_Readers.Scanner.Tables is
subtype YY_Secondary_Index is
Matreshka.Internals.Unicode.Code_Point range 0 .. 16#FF#;
subtype YY_Primary_Index is
Matreshka.Internals.Unicode.Code_Point range 0 .. 16#10FF#;
type YY_Secondary_Array is
array (YY_Secondary_Index) of Interfaces.Unsigned_32;
type YY_Secondary_Array_Access is
not null access constant YY_Secondary_Array;
YY_End_Of_Buffer : constant := 117;
YY_Jam_Base : constant := 4797;
YY_First_Template : constant := 574;
INITIAL : constant := 0;
XML_DECL : constant := 1;
DOCUMENT_10 : constant := 2;
DOCUMENT_11 : constant := 3;
DOCUMENT_U11 : constant := 4;
CDATA_10 : constant := 5;
CDATA_11 : constant := 6;
CDATA_U11 : constant := 7;
PI : constant := 8;
PI_DATA_10 : constant := 9;
PI_DATA_11 : constant := 10;
DOCTYPE_EXTINT : constant := 11;
DOCTYPE_INT : constant := 12;
DOCTYPE_INTSUBSET_10 : constant := 13;
DOCTYPE_INTSUBSET_11 : constant := 14;
ELEMENT_NAME : constant := 15;
ELEMENT_DECL : constant := 16;
ELEMENT_CHILDREN : constant := 17;
ATTLIST_DECL : constant := 18;
ATTLIST_NAME : constant := 19;
ATTLIST_TYPE : constant := 20;
NOTATION_DECL : constant := 21;
ENTITY_DECL : constant := 22;
ENTITY_DEF : constant := 23;
ENTITY_NDATA : constant := 24;
ENTITY_VALUE_10 : constant := 25;
ENTITY_VALUE_11 : constant := 26;
CONDITIONAL_DIRECTIVE : constant := 27;
CONDITIONAL_IGNORE_10 : constant := 28;
CONDITIONAL_IGNORE_11 : constant := 29;
ELEMENT_START : constant := 30;
ATTRIBUTE_VALUE_10 : constant := 31;
ATTRIBUTE_VALUE_11 : constant := 32;
EXTERNAL_ID_SYS : constant := 33;
EXTERNAL_ID_PUB : constant := 34;
YY_Accept : constant
array (Interfaces.Unsigned_32 range 0 .. 573)
of Interfaces.Unsigned_32 :=
( 0, 0, 0, 0, 0, 0, 0, 0,
0, 0, 0, 0, 0, 0, 0, 0,
0, 0, 0, 0, 0, 0, 0, 0,
0, 0, 0, 0, 0, 0, 0, 0,
0, 0, 0, 0, 0, 0, 0, 0,
0, 0, 0, 0, 0, 0, 0, 0,
0, 0, 0, 0, 0, 0, 0, 0,
0, 0, 0, 0, 0, 0, 0, 0,
0, 0, 0, 0, 0, 0, 0, 117,
2, 2, 115, 103, 115, 115, 105, 115,
115, 115, 115, 7, 8, 115, 115, 8,
7, 9, 115, 9, 10, 7, 115, 10,
14, 14, 15, 15, 16, 16, 27, 115,
115, 115, 115, 115, 97, 107, 115, 115,
35, 115, 115, 36, 115, 115, 63, 66,
75, 115, 115, 115, 67, 69, 70, 72,
74, 68, 71, 77, 76, 95, 115, 90,
91, 94, 93, 93, 93, 93, 93, 92,
46, 115, 115, 48, 47, 49, 115, 53,
54, 56, 115, 115, 55, 115, 100, 101,
101, 101, 102, 102, 102, 109, 115, 104,
108, 111, 110, 115, 113, 112, 115, 115,
32, 115, 115, 0, 103, 24, 0, 0,
25, 0, 0, 0, 7, 8, 7, 8,
8, 0, 0, 0, 0, 5, 0, 8,
8, 8, 7, 9, 7, 9, 9, 0,
9, 9, 9, 10, 10, 10, 7, 7,
0, 10, 10, 10, 14, 14, 14, 14,
15, 15, 15, 15, 16, 16, 16, 16,
27, 26, 0, 0, 0, 26, 0, 0,
0, 26, 97, 0, 0, 0, 0, 0,
0, 0, 63, 0, 0, 0, 74, 77,
76, 0, 0, 0, 94, 93, 93, 93,
79, 93, 93, 0, 0, 47, 0, 53,
54, 0, 0, 55, 0, 0, 101, 101,
102, 102, 106, 104, 111, 0, 0, 112,
0, 31, 0, 0, 34, 0, 0, 0,
0, 0, 8, 8, 0, 0, 0, 20,
0, 0, 0, 6, 5, 3, 8, 8,
8, 8, 9, 9, 0, 0, 9, 9,
9, 9, 10, 10, 0, 10, 10, 10,
10, 14, 14, 14, 14, 17, 14, 15,
15, 15, 15, 18, 15, 16, 16, 16,
16, 19, 16, 28, 0, 0, 29, 0,
0, 0, 0, 0, 39, 0, 0, 0,
44, 45, 0, 96, 65, 0, 0, 0,
0, 0, 93, 93, 93, 93, 93, 0,
0, 0, 0, 62, 0, 61, 0, 0,
0, 0, 0, 114, 0, 0, 0, 0,
8, 8, 57, 0, 0, 0, 0, 6,
3, 8, 9, 9, 0, 0, 9, 10,
10, 0, 10, 14, 14, 14, 14, 14,
15, 15, 15, 15, 15, 16, 16, 16,
16, 16, 0, 0, 0, 0, 0, 0,
0, 0, 0, 0, 0, 93, 93, 93,
93, 93, 0, 0, 0, 0, 0, 58,
0, 1, 0, 0, 0, 59, 0, 0,
0, 0, 8, 0, 0, 0, 9, 0,
10, 14, 14, 15, 15, 16, 16, 0,
0, 0, 0, 0, 0, 64, 0, 0,
0, 0, 78, 93, 80, 93, 93, 0,
0, 52, 0, 0, 60, 0, 0, 0,
0, 0, 0, 0, 0, 0, 33, 30,
0, 0, 0, 0, 0, 89, 0, 0,
93, 82, 81, 93, 93, 51, 50, 98,
0, 0, 0, 21, 37, 0, 0, 38,
0, 0, 0, 0, 0, 0, 73, 0,
0, 93, 84, 93, 99, 22, 0, 0,
0, 0, 0, 0, 0, 40, 0, 88,
0, 83, 85, 86, 0, 0, 11, 12,
13, 42, 41, 0, 87, 23, 0, 0,
4, 0, 4, 43, 43, 0);
YY_Meta : constant
array (Interfaces.Unsigned_32 range 0 .. 72)
of Interfaces.Unsigned_32 :=
( 0, 1, 2, 3, 3, 4, 5, 6,
7, 8, 9, 10, 7, 7, 7, 7,
7, 11, 11, 4, 12, 13, 14, 15,
7, 16, 4, 17, 17, 17, 17, 17,
17, 18, 18, 18, 18, 18, 18, 18,
18, 18, 18, 18, 18, 18, 18, 18,
18, 19, 19, 20, 17, 17, 17, 17,
17, 18, 18, 18, 18, 18, 18, 18,
18, 18, 18, 18, 19, 21, 22, 23,
24);
YY_Base : constant
array (Interfaces.Unsigned_32 range 0 .. 754)
of Interfaces.Unsigned_32 :=
( 0, 2363, 2362, 0, 6, 12, 17, 35,
50, 72, 75, 30, 40, 41, 42, 8,
16, 45, 113, 24, 64, 68, 82, 125,
131, 128, 139, 156, 159, 181, 189, 240,
0, 193, 311, 342, 0, 414, 0, 486,
0, 558, 0, 629, 633, 677, 0, 748,
754, 798, 0, 870, 876, 882, 888, 898,
901, 98, 166, 872, 883, 960, 0, 1032,
1034, 1040, 1048, 197, 315, 223, 326, 2384,
4797, 2357, 4797, 211, 2367, 2357, 4797, 2342,
2302, 2292, 2300, 1062, 95, 2348, 119, 624,
1065, 743, 152, 745, 886, 1074, 168, 898,
2301, 2300, 2299, 2293, 2292, 2287, 233, 2296,
2290, 3, 2274, 8, 331, 4797, 2243, 2240,
4797, 0, 18, 2236, 150, 0, 0, 4797,
4797, 2245, 2241, 2237, 4797, 4797, 4797, 4797,
0, 4797, 4797, 0, 0, 4797, 196, 4797,
4797, 0, 0, 2247, 2237, 2243, 17, 4797,
4797, 2226, 2223, 4797, 0, 4797, 2239, 0,
0, 4797, 0, 2261, 0, 64, 4797, 0,
2262, 2215, 0, 2260, 2213, 4797, 2236, 0,
4797, 0, 4797, 2253, 4797, 0, 2253, 2247,
4797, 2249, 2243, 2186, 636, 4797, 2232, 2226,
4797, 2182, 2181, 2164, 1077, 902, 4797, 905,
4797, 166, 2204, 627, 0, 0, 0, 907,
4797, 1073, 1091, 908, 4797, 1038, 4797, 894,
1076, 4797, 1080, 1092, 4797, 1098, 1130, 4797,
896, 1100, 4797, 1112, 2174, 2171, 2170, 36,
2169, 2163, 2162, 616, 2161, 2158, 2157, 617,
646, 4797, 2181, 299, 2175, 4797, 2174, 620,
2173, 4797, 649, 2168, 2151, 2172, 1043, 2163,
1119, 2165, 0, 2138, 2142, 2153, 0, 0,
0, 2146, 2137, 2143, 0, 0, 2146, 2125,
2126, 2123, 2117, 2133, 2116, 0, 2130, 0,
0, 2134, 2133, 0, 2110, 2119, 0, 2098,
0, 2095, 4797, 0, 0, 852, 2121, 0,
2136, 4797, 2125, 2129, 4797, 2123, 2071, 2068,
2068, 2060, 1116, 1131, 189, 0, 2101, 4797,
2105, 2081, 2089, 0, 0, 0, 4797, 1134,
1137, 1149, 1138, 1152, 2100, 2087, 4797, 1142,
1156, 1161, 1160, 1181, 2084, 4797, 1182, 1185,
1191, 2061, 618, 2060, 2059, 4797, 737, 2056,
739, 2055, 2054, 4797, 746, 2050, 865, 2028,
1916, 4797, 889, 4797, 1919, 630, 4797, 1807,
634, 1774, 1723, 1745, 4797, 1721, 182, 1725,
4797, 4797, 1740, 4797, 4797, 1716, 1730, 1711,
1716, 1714, 1710, 1719, 1722, 1712, 1724, 1711,
1702, 1701, 1723, 4797, 1720, 4797, 1701, 1703,
319, 0, 1716, 4797, 1678, 1681, 1680, 1676,
1186, 1192, 4797, 1711, 1690, 1677, 1675, 0,
0, 1200, 1203, 1221, 1687, 1668, 1224, 1212,
1230, 1667, 1235, 1645, 4797, 895, 1011, 4797,
1644, 4797, 1022, 1094, 4797, 1641, 4797, 1104,
1113, 4797, 1656, 1659, 1644, 1657, 1256, 1255,
1251, 1271, 1265, 1258, 1248, 1265, 1246, 1258,
1253, 1243, 1252, 1254, 1257, 1240, 1236, 4797,
1258, 4797, 1221, 1226, 1215, 4797, 1256, 1253,
1223, 1239, 1242, 1247, 1245, 1232, 1246, 1230,
1251, 4797, 1148, 4797, 1169, 4797, 1173, 1221,
1210, 1204, 1201, 1203, 1203, 4797, 1184, 1198,
1192, 1186, 0, 726, 1175, 1187, 1162, 1161,
1149, 4797, 1149, 1148, 4797, 1115, 1110, 1069,
1093, 1063, 1062, 1066, 1011, 1008, 4797, 4797,
1017, 1008, 992, 989, 912, 4797, 907, 892,
901, 0, 0, 890, 887, 4797, 4797, 4797,
891, 821, 813, 4797, 4797, 833, 764, 4797,
759, 758, 740, 744, 730, 735, 4797, 733,
641, 627, 287, 277, 4797, 4797, 169, 192,
167, 157, 132, 107, 103, 4797, 69, 4797,
76, 0, 0, 0, 44, 659, 4797, 4797,
4797, 4797, 4797, 7, 4797, 4797, 662, 773,
0, 778, 0, 0, 0, 4797, 1302, 1326,
1350, 1374, 1398, 1422, 1446, 1470, 1494, 1518,
1542, 1566, 1590, 1614, 1638, 1662, 1682, 1691,
1708, 1726, 1746, 1768, 1790, 1812, 1835, 1858,
1880, 1902, 1924, 1946, 1969, 1992, 2014, 2036,
2058, 2080, 2091, 2102, 2115, 2128, 2141, 2154,
2167, 2180, 2193, 2206, 2228, 2239, 2257, 2279,
2301, 2323, 2336, 2358, 2376, 2398, 2421, 2445,
2467, 2483, 2497, 2506, 2523, 2545, 2558, 2569,
2582, 2593, 2615, 2637, 2659, 2681, 2703, 2725,
2748, 2771, 2794, 2817, 2839, 2861, 2883, 2905,
2927, 2949, 2971, 2993, 3016, 3039, 3062, 3085,
3107, 3129, 3151, 3173, 3195, 3217, 3230, 3243,
3256, 3269, 3282, 3295, 3308, 3321, 3334, 3347,
3369, 3382, 3395, 3417, 3439, 3461, 3474, 3496,
3509, 3531, 3554, 3578, 3600, 3616, 3633, 3655,
108, 3668, 3681, 3694, 3707, 3729, 3751, 3773,
3795, 3817, 3839, 3862, 3885, 3908, 3931, 3953,
3975, 3997, 4019, 4041, 4063, 4085, 4107, 4130,
4153, 4176, 4199, 4221, 4243, 4265, 4287, 4300,
4313, 4326, 4339, 4352, 310, 4365, 4387, 755,
4409, 4422, 4435, 4457, 4479, 4501, 4523, 4546,
4569, 4591, 4613, 4635, 4657, 4680, 4703, 4725,
4738, 4760, 4773);
YY_Def : constant
array (Interfaces.Unsigned_32 range 0 .. 754)
of Interfaces.Unsigned_32 :=
( 0, 574, 574, 575, 575, 576, 576, 577,
577, 578, 578, 579, 579, 580, 580, 581,
581, 575, 575, 582, 582, 583, 583, 575,
575, 575, 575, 575, 575, 575, 575, 573,
31, 575, 575, 573, 35, 573, 37, 573,
39, 573, 41, 575, 575, 573, 45, 575,
575, 573, 49, 584, 584, 585, 585, 575,
575, 586, 586, 587, 587, 573, 61, 588,
588, 589, 589, 575, 575, 575, 575, 573,
573, 573, 573, 573, 590, 591, 573, 573,
573, 573, 573, 592, 592, 593, 594, 595,
596, 596, 594, 597, 598, 598, 594, 599,
600, 601, 602, 603, 604, 605, 573, 573,
606, 607, 608, 609, 573, 573, 573, 573,
573, 610, 573, 573, 573, 611, 612, 573,
573, 573, 573, 573, 573, 573, 573, 573,
613, 573, 573, 614, 615, 573, 573, 573,
573, 616, 617, 617, 617, 617, 617, 573,
573, 573, 573, 573, 618, 573, 573, 619,
620, 573, 621, 622, 623, 573, 573, 624,
573, 573, 625, 573, 573, 573, 573, 626,
573, 627, 573, 628, 573, 629, 630, 631,
573, 632, 633, 573, 573, 573, 634, 635,
573, 573, 573, 573, 636, 636, 573, 637,
573, 573, 638, 573, 639, 640, 641, 642,
573, 643, 644, 644, 573, 645, 573, 573,
646, 573, 647, 648, 573, 649, 648, 573,
573, 650, 573, 651, 652, 653, 654, 655,
656, 657, 658, 659, 660, 661, 662, 663,
573, 573, 664, 665, 666, 573, 667, 668,
669, 573, 573, 573, 573, 670, 573, 573,
573, 671, 672, 573, 573, 573, 673, 674,
675, 573, 573, 573, 676, 677, 677, 677,
677, 677, 677, 573, 573, 678, 573, 679,
680, 681, 682, 683, 573, 573, 684, 573,
685, 573, 573, 686, 687, 573, 688, 689,
690, 573, 691, 692, 573, 693, 573, 573,
573, 573, 694, 695, 573, 696, 697, 573,
573, 573, 573, 698, 699, 700, 573, 701,
702, 702, 703, 704, 573, 573, 573, 705,
706, 706, 707, 708, 573, 573, 709, 710,
710, 711, 712, 713, 714, 573, 714, 715,
716, 717, 718, 573, 718, 719, 720, 721,
722, 573, 722, 573, 723, 724, 573, 725,
726, 573, 573, 727, 573, 573, 573, 573,
573, 573, 728, 573, 573, 573, 573, 573,
573, 573, 729, 729, 729, 729, 729, 573,
573, 573, 730, 573, 731, 573, 573, 573,
573, 732, 733, 573, 573, 573, 573, 573,
734, 734, 573, 735, 736, 573, 573, 737,
738, 739, 740, 740, 741, 573, 742, 743,
743, 573, 744, 745, 573, 745, 746, 573,
747, 573, 747, 748, 573, 749, 573, 749,
750, 573, 573, 573, 573, 573, 573, 573,
573, 573, 573, 573, 573, 729, 729, 729,
729, 729, 573, 573, 573, 573, 573, 573,
732, 573, 573, 573, 573, 573, 736, 736,
573, 573, 739, 741, 741, 573, 742, 573,
744, 573, 746, 573, 748, 573, 750, 573,
573, 573, 573, 573, 573, 573, 573, 573,
573, 573, 729, 729, 729, 729, 729, 573,
573, 573, 573, 573, 573, 573, 573, 573,
573, 573, 573, 573, 573, 573, 573, 573,
573, 573, 573, 573, 573, 573, 573, 573,
729, 729, 729, 729, 729, 573, 573, 573,
573, 573, 573, 573, 573, 573, 573, 573,
573, 573, 573, 573, 573, 573, 573, 573,
573, 729, 729, 729, 573, 573, 573, 573,
573, 573, 573, 573, 573, 573, 573, 573,
573, 729, 729, 729, 573, 573, 573, 573,
573, 573, 573, 573, 573, 573, 751, 573,
752, 753, 752, 754, 754, 0, 573, 573,
573, 573, 573, 573, 573, 573, 573, 573,
573, 573, 573, 573, 573, 573, 573, 573,
573, 573, 573, 573, 573, 573, 573, 573,
573, 573, 573, 573, 573, 573, 573, 573,
573, 573, 573, 573, 573, 573, 573, 573,
573, 573, 573, 573, 573, 573, 573, 573,
573, 573, 573, 573, 573, 573, 573, 573,
573, 573, 573, 573, 573, 573, 573, 573,
573, 573, 573, 573, 573, 573, 573, 573,
573, 573, 573, 573, 573, 573, 573, 573,
573, 573, 573, 573, 573, 573, 573, 573,
573, 573, 573, 573, 573, 573, 573, 573,
573, 573, 573, 573, 573, 573, 573, 573,
573, 573, 573, 573, 573, 573, 573, 573,
573, 573, 573, 573, 573, 573, 573, 573,
573, 573, 573, 573, 573, 573, 573, 573,
573, 573, 573, 573, 573, 573, 573, 573,
573, 573, 573, 573, 573, 573, 573, 573,
573, 573, 573, 573, 573, 573, 573, 573,
573, 573, 573, 573, 573, 573, 573, 573,
573, 573, 573, 573, 573, 573, 573, 573,
573, 573, 573, 573, 573, 573, 573, 573,
573, 573, 573);
YY_Nxt : constant
array (Interfaces.Unsigned_32 range 0 .. 4869)
of Interfaces.Unsigned_32 :=
( 0, 573, 75, 75, 75, 573, 76, 573,
75, 75, 75, 77, 76, 74, 83, 83,
83, 77, 74, 83, 83, 83, 85, 246,
78, 74, 79, 85, 237, 235, 78, 74,
79, 241, 239, 86, 74, 88, 88, 88,
86, 74, 74, 74, 198, 85, 567, 102,
102, 102, 105, 74, 88, 88, 88, 265,
80, 266, 90, 101, 85, 333, 80, 87,
81, 74, 82, 101, 87, 74, 81, 103,
82, 90, 93, 93, 93, 93, 93, 93,
74, 97, 85, 74, 74, 85, 91, 334,
74, 74, 105, 97, 99, 99, 107, 94,
74, 276, 94, 74, 565, 91, 74, 277,
74, 192, 564, 74, 107, 563, 74, 74,
74, 74, 74, 102, 102, 102, 192, 74,
395, 160, 74, 95, 195, 395, 95, 108,
108, 108, 108, 108, 108, 108, 108, 108,
74, 74, 196, 103, 74, 108, 108, 108,
74, 198, 191, 74, 562, 161, 109, 74,
561, 109, 74, 248, 109, 207, 108, 108,
108, 108, 108, 108, 109, 113, 110, 74,
113, 111, 74, 196, 110, 216, 112, 111,
198, 112, 198, 114, 112, 560, 114, 108,
108, 108, 300, 196, 112, 160, 113, 108,
108, 108, 198, 75, 75, 75, 113, 75,
75, 75, 117, 174, 116, 119, 559, 115,
175, 300, 115, 394, 116, 180, 180, 180,
558, 161, 120, 429, 121, 430, 176, 557,
122, 75, 75, 75, 257, 177, 556, 258,
115, 301, 178, 232, 232, 232, 74, 259,
115, 74, 75, 75, 75, 74, 74, 74,
74, 117, 74, 74, 74, 74, 74, 74,
74, 74, 74, 74, 74, 118, 74, 74,
74, 74, 74, 118, 118, 118, 118, 118,
118, 118, 118, 118, 118, 118, 118, 118,
118, 118, 118, 118, 118, 118, 118, 118,
118, 74, 74, 74, 118, 118, 118, 118,
118, 118, 118, 118, 118, 118, 118, 118,
118, 118, 118, 118, 74, 74, 74, 118,
74, 75, 75, 75, 555, 75, 75, 75,
117, 174, 448, 119, 347, 235, 175, 448,
75, 75, 75, 554, 177, 242, 242, 242,
120, 178, 121, 384, 176, 447, 122, 74,
75, 75, 75, 74, 74, 123, 74, 117,
74, 74, 119, 124, 125, 126, 127, 74,
74, 74, 74, 128, 74, 74, 74, 120,
129, 128, 128, 128, 128, 128, 128, 128,
128, 128, 128, 128, 128, 128, 128, 128,
128, 128, 128, 128, 128, 128, 128, 74,
74, 74, 128, 128, 128, 128, 128, 128,
128, 128, 128, 128, 128, 128, 128, 128,
128, 128, 130, 74, 74, 128, 74, 74,
75, 75, 75, 74, 74, 74, 74, 117,
74, 74, 74, 74, 74, 74, 74, 74,
74, 74, 74, 131, 74, 74, 74, 120,
74, 131, 131, 131, 131, 131, 131, 131,
131, 131, 131, 131, 131, 131, 131, 131,
131, 131, 131, 131, 131, 131, 131, 74,
74, 74, 131, 131, 131, 131, 131, 131,
131, 131, 131, 131, 131, 131, 131, 131,
131, 131, 74, 74, 74, 131, 74, 74,
75, 75, 75, 74, 74, 74, 74, 117,
74, 74, 74, 74, 74, 74, 74, 74,
74, 74, 74, 132, 74, 74, 74, 74,
74, 132, 132, 132, 132, 132, 132, 132,
132, 132, 132, 132, 132, 132, 132, 132,
132, 132, 132, 132, 132, 132, 132, 74,
74, 74, 132, 132, 132, 132, 132, 132,
132, 132, 132, 132, 132, 132, 132, 132,
132, 132, 74, 74, 74, 132, 74, 74,
75, 75, 75, 74, 133, 134, 74, 117,
74, 133, 135, 136, 74, 74, 74, 137,
137, 74, 137, 138, 74, 74, 74, 120,
74, 138, 138, 139, 138, 140, 138, 138,
138, 141, 138, 138, 138, 142, 138, 138,
138, 138, 138, 138, 138, 138, 138, 74,
74, 74, 138, 138, 138, 138, 138, 138,
138, 138, 138, 138, 138, 138, 138, 138,
138, 138, 143, 74, 137, 138, 74, 75,
75, 75, 200, 75, 75, 75, 180, 180,
180, 339, 345, 412, 304, 350, 239, 200,
232, 232, 232, 242, 242, 242, 144, 347,
349, 305, 144, 350, 352, 566, 566, 566,
566, 566, 566, 340, 346, 413, 145, 553,
552, 146, 145, 201, 306, 146, 74, 75,
75, 75, 74, 74, 74, 74, 147, 74,
74, 74, 74, 74, 74, 74, 74, 74,
74, 74, 148, 74, 74, 74, 74, 74,
148, 148, 148, 148, 148, 148, 148, 148,
148, 148, 148, 148, 148, 148, 148, 148,
148, 148, 148, 148, 148, 148, 74, 74,
74, 148, 148, 148, 148, 148, 148, 148,
148, 148, 148, 148, 148, 148, 148, 148,
148, 74, 74, 74, 148, 74, 75, 75,
75, 206, 149, 209, 75, 75, 75, 149,
149, 512, 415, 551, 417, 149, 206, 395,
209, 395, 550, 420, 395, 120, 513, 569,
569, 569, 549, 120, 569, 569, 569, 548,
547, 546, 545, 150, 334, 145, 418, 544,
146, 150, 205, 145, 210, 340, 146, 74,
75, 75, 75, 74, 74, 74, 74, 74,
74, 74, 74, 74, 74, 74, 74, 74,
74, 74, 74, 151, 74, 74, 74, 74,
74, 151, 151, 151, 151, 151, 151, 151,
151, 151, 151, 151, 151, 151, 151, 151,
151, 151, 151, 151, 151, 151, 151, 74,
74, 74, 151, 151, 151, 151, 151, 151,
151, 151, 151, 151, 151, 151, 151, 151,
151, 151, 74, 74, 74, 151, 74, 74,
384, 74, 543, 542, 153, 74, 541, 154,
155, 153, 153, 74, 74, 154, 155, 153,
153, 74, 422, 154, 155, 153, 153, 163,
212, 154, 155, 153, 108, 108, 108, 108,
108, 108, 163, 117, 218, 212, 117, 316,
192, 316, 425, 192, 423, 310, 206, 385,
412, 218, 540, 164, 305, 192, 305, 539,
192, 538, 310, 206, 537, 157, 164, 536,
157, 213, 535, 534, 346, 74, 74, 317,
74, 324, 413, 158, 74, 219, 158, 74,
74, 191, 74, 74, 299, 74, 311, 205,
74, 74, 75, 75, 75, 74, 165, 74,
74, 74, 74, 165, 74, 74, 74, 74,
74, 74, 74, 166, 74, 167, 74, 74,
78, 168, 74, 167, 167, 167, 167, 167,
167, 167, 167, 167, 167, 167, 167, 167,
167, 167, 167, 167, 167, 167, 167, 167,
167, 74, 74, 74, 167, 167, 167, 167,
167, 167, 167, 167, 167, 167, 167, 167,
167, 167, 167, 167, 74, 74, 74, 167,
74, 74, 533, 74, 465, 532, 170, 531,
170, 74, 171, 170, 171, 170, 170, 417,
206, 74, 171, 170, 530, 529, 170, 172,
528, 172, 171, 170, 304, 206, 466, 172,
188, 188, 188, 202, 202, 202, 357, 172,
190, 418, 358, 204, 214, 214, 214, 188,
188, 188, 359, 200, 215, 190, 318, 190,
204, 315, 209, 527, 360, 202, 202, 202,
200, 215, 192, 318, 190, 204, 212, 209,
74, 206, 74, 526, 212, 74, 325, 525,
74, 191, 204, 212, 205, 74, 524, 467,
74, 212, 218, 325, 313, 213, 192, 319,
191, 422, 523, 321, 214, 214, 214, 218,
316, 212, 469, 192, 215, 192, 205, 213,
310, 468, 357, 310, 206, 323, 358, 326,
318, 215, 192, 423, 192, 310, 359, 200,
310, 206, 206, 328, 470, 318, 318, 191,
360, 522, 212, 209, 200, 465, 200, 206,
521, 206, 520, 318, 519, 213, 393, 212,
209, 401, 209, 518, 311, 205, 517, 212,
325, 406, 467, 325, 192, 516, 469, 466,
313, 218, 192, 403, 212, 325, 212, 319,
325, 192, 310, 213, 321, 206, 218, 192,
218, 192, 515, 514, 468, 511, 212, 310,
470, 310, 206, 510, 509, 508, 507, 206,
408, 410, 318, 212, 326, 191, 506, 505,
212, 504, 328, 393, 206, 325, 206, 318,
503, 318, 502, 458, 310, 212, 205, 212,
318, 501, 325, 500, 325, 325, 499, 213,
460, 310, 498, 310, 497, 318, 496, 318,
403, 455, 325, 462, 325, 495, 494, 493,
492, 408, 491, 490, 489, 488, 464, 487,
486, 485, 484, 483, 482, 458, 481, 480,
479, 462, 478, 477, 476, 475, 464, 72,
72, 72, 72, 72, 72, 72, 72, 72,
72, 72, 72, 72, 72, 72, 72, 72,
72, 72, 72, 72, 72, 72, 72, 74,
74, 74, 74, 74, 74, 74, 74, 74,
74, 74, 74, 74, 74, 74, 74, 74,
74, 74, 74, 74, 74, 74, 74, 84,
84, 84, 84, 84, 84, 84, 84, 84,
84, 84, 84, 84, 84, 84, 84, 84,
84, 84, 84, 84, 84, 84, 84, 89,
89, 89, 89, 89, 89, 89, 89, 89,
89, 89, 89, 89, 89, 89, 89, 89,
89, 89, 89, 89, 89, 89, 89, 92,
92, 92, 92, 92, 92, 92, 92, 92,
92, 92, 92, 92, 92, 92, 92, 92,
92, 92, 92, 92, 92, 92, 92, 96,
96, 96, 96, 96, 96, 96, 96, 96,
96, 96, 96, 96, 96, 96, 96, 96,
96, 96, 96, 96, 96, 96, 96, 98,
98, 98, 98, 98, 98, 98, 98, 98,
98, 98, 98, 98, 98, 98, 98, 98,
98, 98, 98, 98, 98, 98, 98, 100,
100, 100, 100, 100, 100, 100, 100, 100,
100, 100, 100, 100, 100, 100, 100, 100,
100, 100, 100, 100, 100, 100, 100, 104,
104, 104, 104, 104, 104, 104, 104, 104,
104, 104, 104, 104, 104, 104, 104, 104,
104, 104, 104, 104, 104, 104, 104, 106,
106, 106, 106, 106, 106, 106, 106, 106,
106, 106, 106, 106, 106, 106, 106, 106,
106, 106, 106, 106, 106, 106, 106, 152,
152, 152, 152, 152, 152, 152, 152, 152,
152, 152, 152, 152, 152, 152, 152, 152,
152, 152, 152, 152, 152, 152, 152, 156,
156, 156, 156, 156, 156, 156, 156, 156,
156, 156, 156, 156, 156, 156, 156, 156,
156, 156, 156, 156, 156, 156, 156, 159,
159, 159, 159, 159, 159, 159, 159, 159,
159, 159, 159, 159, 159, 159, 159, 159,
159, 159, 159, 159, 159, 159, 159, 162,
162, 162, 162, 162, 162, 162, 162, 162,
162, 162, 162, 162, 162, 162, 162, 162,
162, 162, 162, 162, 162, 162, 162, 169,
169, 169, 169, 169, 169, 169, 169, 169,
169, 169, 169, 169, 169, 169, 169, 169,
169, 169, 169, 169, 169, 169, 169, 173,
173, 173, 173, 173, 173, 173, 173, 173,
173, 173, 173, 173, 173, 173, 173, 173,
173, 173, 173, 173, 173, 173, 173, 182,
474, 473, 472, 471, 229, 182, 182, 225,
221, 463, 461, 182, 182, 183, 183, 183,
460, 457, 456, 455, 183, 183, 189, 189,
189, 189, 189, 189, 189, 189, 189, 189,
189, 189, 189, 189, 189, 189, 189, 189,
189, 189, 189, 189, 194, 453, 452, 451,
450, 449, 387, 194, 446, 445, 381, 194,
194, 379, 444, 443, 442, 194, 197, 441,
440, 439, 438, 437, 436, 435, 434, 197,
433, 432, 363, 197, 197, 431, 428, 356,
427, 197, 199, 199, 199, 199, 199, 199,
199, 199, 199, 199, 199, 199, 199, 199,
199, 199, 199, 199, 199, 199, 199, 199,
203, 203, 203, 203, 203, 203, 203, 203,
203, 203, 203, 203, 203, 203, 203, 203,
203, 203, 203, 426, 203, 203, 208, 208,
208, 208, 208, 208, 208, 208, 208, 208,
208, 208, 208, 208, 208, 208, 208, 208,
208, 352, 208, 208, 211, 211, 211, 211,
211, 211, 211, 211, 211, 211, 211, 211,
211, 211, 211, 211, 211, 211, 211, 211,
211, 211, 211, 217, 217, 217, 217, 217,
217, 217, 217, 217, 217, 217, 217, 217,
217, 217, 217, 217, 217, 217, 217, 217,
217, 217, 220, 220, 220, 220, 220, 220,
220, 220, 220, 220, 220, 220, 220, 220,
220, 220, 220, 220, 220, 220, 220, 220,
222, 222, 222, 222, 222, 222, 222, 222,
222, 222, 222, 222, 222, 222, 222, 222,
222, 222, 222, 222, 222, 222, 224, 224,
224, 224, 224, 224, 224, 224, 224, 224,
224, 224, 224, 224, 224, 224, 224, 224,
224, 349, 224, 224, 226, 226, 226, 226,
226, 226, 226, 226, 226, 226, 226, 226,
226, 226, 226, 226, 226, 226, 226, 343,
226, 226, 228, 228, 228, 228, 228, 228,
228, 228, 228, 228, 228, 228, 228, 228,
228, 228, 228, 228, 228, 228, 228, 228,
228, 230, 230, 230, 230, 230, 230, 230,
230, 230, 230, 230, 230, 230, 230, 230,
230, 230, 230, 230, 230, 230, 230, 230,
234, 234, 234, 234, 234, 234, 234, 234,
234, 234, 234, 234, 234, 234, 234, 234,
234, 234, 234, 234, 234, 234, 236, 236,
236, 236, 236, 236, 236, 236, 236, 236,
236, 236, 236, 236, 236, 236, 236, 236,
236, 236, 236, 236, 238, 238, 238, 238,
238, 238, 238, 238, 238, 238, 238, 238,
238, 238, 238, 238, 238, 238, 238, 424,
238, 238, 240, 240, 240, 240, 240, 240,
240, 240, 240, 240, 240, 240, 240, 240,
240, 240, 240, 240, 240, 229, 240, 240,
245, 337, 419, 225, 245, 245, 331, 414,
221, 409, 245, 249, 405, 404, 398, 249,
249, 397, 396, 303, 391, 249, 250, 250,
250, 390, 389, 388, 250, 250, 292, 292,
289, 250, 250, 254, 254, 254, 289, 387,
360, 254, 254, 360, 383, 382, 254, 254,
255, 255, 255, 381, 379, 377, 255, 255,
376, 375, 374, 255, 255, 256, 256, 256,
373, 372, 371, 256, 256, 370, 369, 368,
256, 256, 260, 260, 260, 367, 366, 365,
260, 260, 364, 363, 361, 260, 260, 261,
261, 261, 356, 354, 353, 261, 261, 352,
239, 349, 261, 261, 269, 269, 269, 235,
343, 342, 269, 269, 229, 337, 336, 269,
269, 271, 271, 271, 225, 331, 330, 271,
271, 221, 303, 297, 271, 271, 272, 272,
272, 296, 272, 272, 295, 181, 181, 272,
272, 272, 272, 272, 272, 272, 272, 272,
272, 272, 272, 272, 273, 294, 292, 292,
273, 273, 289, 289, 285, 282, 273, 274,
247, 281, 247, 279, 193, 270, 274, 268,
267, 264, 274, 274, 263, 262, 253, 252,
274, 275, 275, 275, 251, 275, 275, 247,
244, 243, 275, 275, 275, 275, 275, 275,
275, 275, 275, 275, 239, 275, 275, 278,
278, 278, 278, 278, 278, 278, 278, 278,
278, 278, 278, 278, 235, 278, 278, 278,
278, 233, 278, 278, 278, 280, 280, 280,
280, 280, 280, 280, 280, 280, 280, 280,
280, 280, 231, 280, 280, 280, 280, 229,
227, 280, 280, 283, 283, 283, 225, 223,
221, 283, 283, 193, 187, 186, 283, 283,
284, 284, 284, 185, 284, 284, 284, 184,
181, 284, 284, 284, 284, 181, 284, 284,
284, 284, 284, 284, 284, 284, 286, 179,
573, 73, 73, 573, 573, 286, 573, 573,
573, 286, 286, 573, 573, 573, 573, 286,
287, 287, 287, 573, 287, 287, 287, 573,
573, 287, 287, 287, 287, 573, 287, 287,
287, 287, 287, 573, 287, 287, 288, 288,
288, 288, 288, 288, 288, 288, 288, 288,
288, 288, 288, 288, 288, 288, 288, 288,
288, 288, 288, 288, 288, 288, 290, 290,
290, 290, 290, 290, 290, 290, 290, 290,
290, 290, 290, 290, 290, 290, 290, 290,
290, 290, 290, 290, 290, 290, 291, 291,
291, 291, 291, 291, 573, 291, 291, 291,
291, 291, 573, 573, 291, 291, 293, 293,
573, 293, 293, 293, 573, 293, 293, 293,
293, 293, 573, 573, 293, 293, 182, 573,
573, 573, 573, 573, 182, 182, 573, 573,
573, 573, 182, 182, 183, 183, 183, 573,
573, 573, 573, 183, 183, 189, 189, 189,
189, 189, 189, 189, 189, 189, 189, 189,
189, 189, 189, 189, 189, 189, 189, 189,
189, 189, 189, 298, 298, 298, 298, 298,
298, 298, 298, 298, 298, 298, 298, 298,
298, 298, 298, 298, 298, 298, 298, 298,
298, 302, 302, 302, 302, 573, 573, 302,
302, 573, 573, 573, 302, 302, 307, 573,
573, 573, 307, 307, 573, 573, 573, 573,
307, 308, 308, 308, 573, 573, 573, 308,
308, 573, 573, 573, 308, 308, 309, 573,
573, 573, 309, 309, 573, 573, 573, 573,
309, 199, 199, 199, 199, 199, 199, 199,
199, 199, 199, 199, 199, 199, 199, 199,
199, 199, 199, 199, 199, 199, 199, 312,
312, 312, 312, 312, 312, 312, 312, 312,
312, 312, 312, 312, 312, 312, 312, 312,
312, 312, 312, 312, 312, 203, 203, 203,
203, 203, 203, 203, 203, 203, 203, 203,
203, 203, 203, 203, 203, 203, 203, 203,
573, 203, 203, 314, 314, 314, 314, 314,
314, 314, 314, 314, 314, 314, 314, 314,
314, 314, 314, 314, 314, 314, 573, 314,
314, 208, 208, 208, 208, 208, 208, 208,
208, 208, 208, 208, 208, 208, 208, 208,
208, 208, 208, 208, 573, 208, 208, 320,
320, 320, 320, 320, 320, 320, 320, 320,
320, 320, 320, 320, 320, 320, 320, 320,
320, 320, 573, 320, 320, 211, 211, 211,
211, 211, 211, 211, 211, 211, 211, 211,
211, 211, 211, 211, 211, 211, 211, 211,
211, 211, 211, 211, 322, 322, 322, 322,
322, 322, 322, 322, 322, 322, 322, 322,
322, 322, 322, 322, 322, 322, 322, 322,
322, 322, 322, 217, 217, 217, 217, 217,
217, 217, 217, 217, 217, 217, 217, 217,
217, 217, 217, 217, 217, 217, 217, 217,
217, 217, 327, 327, 327, 327, 327, 327,
327, 327, 327, 327, 327, 327, 327, 327,
327, 327, 327, 327, 327, 327, 327, 327,
327, 220, 220, 220, 220, 220, 220, 220,
220, 220, 220, 220, 220, 220, 220, 220,
220, 220, 220, 220, 220, 220, 220, 329,
329, 329, 329, 329, 329, 329, 329, 329,
329, 329, 329, 329, 329, 329, 329, 329,
329, 329, 329, 329, 329, 222, 222, 222,
222, 222, 222, 222, 222, 222, 222, 222,
222, 222, 222, 222, 222, 222, 222, 222,
222, 222, 222, 332, 332, 332, 332, 332,
332, 332, 332, 332, 332, 332, 332, 332,
332, 332, 332, 332, 332, 332, 332, 332,
332, 224, 224, 224, 224, 224, 224, 224,
224, 224, 224, 224, 224, 224, 224, 224,
224, 224, 224, 224, 573, 224, 224, 335,
335, 335, 335, 335, 335, 335, 335, 335,
335, 335, 335, 335, 335, 335, 335, 335,
335, 335, 573, 335, 335, 226, 226, 226,
226, 226, 226, 226, 226, 226, 226, 226,
226, 226, 226, 226, 226, 226, 226, 226,
573, 226, 226, 338, 338, 338, 338, 338,
338, 338, 338, 338, 338, 338, 338, 338,
338, 338, 338, 338, 338, 338, 573, 338,
338, 228, 228, 228, 228, 228, 228, 228,
228, 228, 228, 228, 228, 228, 228, 228,
228, 228, 228, 228, 228, 228, 228, 228,
341, 341, 341, 341, 341, 341, 341, 341,
341, 341, 341, 341, 341, 341, 341, 341,
341, 341, 341, 341, 341, 341, 341, 230,
230, 230, 230, 230, 230, 230, 230, 230,
230, 230, 230, 230, 230, 230, 230, 230,
230, 230, 230, 230, 230, 230, 344, 344,
344, 344, 344, 344, 344, 344, 344, 344,
344, 344, 344, 344, 344, 344, 344, 344,
344, 344, 344, 344, 344, 234, 234, 234,
234, 234, 234, 234, 234, 234, 234, 234,
234, 234, 234, 234, 234, 234, 234, 234,
234, 234, 234, 236, 236, 236, 236, 236,
236, 236, 236, 236, 236, 236, 236, 236,
236, 236, 236, 236, 236, 236, 236, 236,
236, 348, 348, 348, 348, 348, 348, 348,
348, 348, 348, 348, 348, 348, 348, 348,
348, 348, 348, 348, 348, 348, 348, 238,
238, 238, 238, 238, 238, 238, 238, 238,
238, 238, 238, 238, 238, 238, 238, 238,
238, 238, 573, 238, 238, 240, 240, 240,
240, 240, 240, 240, 240, 240, 240, 240,
240, 240, 240, 240, 240, 240, 240, 240,
573, 240, 240, 351, 351, 351, 351, 351,
351, 351, 351, 351, 351, 351, 351, 351,
351, 351, 351, 351, 351, 351, 573, 351,
351, 355, 355, 355, 355, 573, 573, 355,
355, 573, 573, 573, 355, 355, 362, 362,
362, 362, 573, 573, 362, 362, 573, 573,
573, 362, 362, 250, 250, 250, 573, 573,
573, 250, 250, 573, 573, 573, 250, 250,
254, 254, 254, 573, 573, 573, 254, 254,
573, 573, 573, 254, 254, 255, 255, 255,
573, 573, 573, 255, 255, 573, 573, 573,
255, 255, 256, 256, 256, 573, 573, 573,
256, 256, 573, 573, 573, 256, 256, 260,
260, 260, 573, 573, 573, 260, 260, 573,
573, 573, 260, 260, 261, 261, 261, 573,
573, 573, 261, 261, 573, 573, 573, 261,
261, 269, 269, 269, 573, 573, 573, 269,
269, 573, 573, 573, 269, 269, 271, 271,
271, 573, 573, 573, 271, 271, 573, 573,
573, 271, 271, 272, 272, 272, 573, 272,
272, 573, 573, 573, 272, 272, 272, 272,
272, 272, 272, 272, 272, 272, 272, 272,
272, 378, 378, 378, 378, 573, 573, 378,
378, 573, 573, 573, 378, 378, 380, 380,
380, 380, 573, 573, 380, 380, 573, 573,
573, 380, 380, 275, 275, 275, 573, 275,
275, 573, 573, 573, 275, 275, 275, 275,
275, 275, 275, 275, 275, 275, 573, 275,
275, 278, 278, 278, 278, 278, 278, 278,
278, 278, 278, 278, 278, 278, 573, 278,
278, 278, 278, 573, 278, 278, 278, 280,
280, 280, 280, 280, 280, 280, 280, 280,
280, 280, 280, 280, 573, 280, 280, 280,
280, 573, 573, 280, 280, 283, 283, 283,
573, 573, 573, 283, 283, 573, 573, 573,
283, 283, 284, 284, 284, 573, 284, 284,
284, 573, 573, 284, 284, 284, 284, 573,
284, 284, 284, 284, 284, 284, 284, 284,
386, 386, 386, 386, 573, 573, 386, 386,
573, 573, 573, 386, 386, 287, 287, 287,
573, 287, 287, 287, 573, 573, 287, 287,
287, 287, 573, 287, 287, 287, 287, 287,
573, 287, 287, 288, 288, 288, 288, 288,
288, 288, 288, 288, 288, 288, 288, 288,
288, 288, 288, 288, 288, 288, 288, 288,
288, 288, 288, 290, 290, 290, 290, 290,
290, 290, 290, 290, 290, 290, 290, 290,
290, 290, 290, 290, 290, 290, 290, 290,
290, 290, 290, 291, 291, 291, 291, 291,
291, 573, 291, 291, 291, 291, 291, 573,
573, 291, 291, 293, 293, 573, 293, 293,
293, 573, 293, 293, 293, 293, 293, 573,
573, 293, 293, 298, 298, 298, 298, 298,
298, 298, 298, 298, 298, 298, 298, 298,
298, 298, 298, 298, 298, 298, 298, 298,
298, 392, 392, 392, 392, 392, 392, 392,
392, 392, 392, 392, 392, 392, 392, 392,
392, 392, 392, 392, 392, 392, 392, 302,
302, 302, 302, 573, 573, 302, 302, 573,
573, 573, 302, 302, 399, 399, 399, 573,
573, 573, 399, 399, 573, 573, 573, 399,
399, 308, 308, 308, 573, 573, 573, 308,
308, 573, 573, 573, 308, 308, 400, 400,
400, 573, 573, 573, 400, 400, 573, 573,
573, 400, 400, 199, 199, 199, 199, 199,
199, 199, 199, 199, 199, 199, 199, 199,
199, 199, 199, 199, 199, 199, 199, 199,
199, 312, 312, 312, 312, 312, 312, 312,
312, 312, 312, 312, 312, 312, 312, 573,
312, 312, 312, 312, 312, 312, 312, 314,
314, 314, 314, 314, 314, 314, 314, 314,
314, 314, 314, 314, 314, 314, 314, 314,
314, 314, 573, 314, 314, 402, 402, 402,
402, 402, 402, 402, 402, 402, 402, 402,
402, 402, 402, 402, 402, 402, 402, 402,
573, 402, 402, 208, 208, 208, 208, 208,
208, 208, 208, 208, 208, 208, 208, 208,
208, 208, 208, 208, 208, 208, 573, 208,
208, 320, 320, 320, 320, 320, 320, 320,
320, 320, 320, 320, 320, 320, 320, 573,
320, 320, 320, 320, 573, 320, 320, 322,
322, 322, 322, 322, 322, 322, 322, 322,
322, 322, 322, 322, 322, 322, 322, 322,
322, 322, 322, 322, 322, 322, 407, 407,
407, 407, 407, 407, 407, 407, 407, 407,
407, 407, 407, 407, 407, 407, 407, 407,
407, 407, 407, 407, 407, 217, 217, 217,
217, 217, 217, 217, 217, 217, 217, 217,
217, 217, 217, 217, 217, 217, 217, 217,
217, 217, 217, 217, 327, 327, 327, 327,
327, 327, 327, 327, 327, 327, 327, 327,
327, 327, 327, 573, 327, 327, 327, 327,
327, 327, 327, 329, 329, 329, 329, 329,
329, 329, 329, 329, 329, 329, 329, 329,
329, 329, 329, 329, 329, 329, 329, 329,
329, 411, 411, 411, 411, 411, 411, 411,
411, 411, 411, 411, 411, 411, 411, 411,
411, 411, 411, 411, 411, 411, 411, 222,
222, 222, 222, 222, 222, 222, 222, 222,
222, 222, 222, 222, 222, 222, 222, 222,
222, 222, 222, 222, 222, 332, 332, 332,
332, 332, 332, 332, 332, 332, 332, 332,
332, 332, 332, 573, 332, 332, 332, 332,
332, 332, 332, 335, 335, 335, 335, 335,
335, 335, 335, 335, 335, 335, 335, 335,
335, 335, 335, 335, 335, 335, 573, 335,
335, 416, 416, 416, 416, 416, 416, 416,
416, 416, 416, 416, 416, 416, 416, 416,
416, 416, 416, 416, 573, 416, 416, 226,
226, 226, 226, 226, 226, 226, 226, 226,
226, 226, 226, 226, 226, 226, 226, 226,
226, 226, 573, 226, 226, 338, 338, 338,
338, 338, 338, 338, 338, 338, 338, 338,
338, 338, 338, 573, 338, 338, 338, 338,
573, 338, 338, 341, 341, 341, 341, 341,
341, 341, 341, 341, 341, 341, 341, 341,
341, 341, 341, 341, 341, 341, 341, 341,
341, 341, 421, 421, 421, 421, 421, 421,
421, 421, 421, 421, 421, 421, 421, 421,
421, 421, 421, 421, 421, 421, 421, 421,
421, 230, 230, 230, 230, 230, 230, 230,
230, 230, 230, 230, 230, 230, 230, 230,
230, 230, 230, 230, 230, 230, 230, 230,
344, 344, 344, 344, 344, 344, 344, 344,
344, 344, 344, 344, 344, 344, 344, 573,
344, 344, 344, 344, 344, 344, 344, 348,
348, 348, 348, 348, 348, 348, 348, 348,
348, 348, 348, 348, 348, 348, 348, 348,
348, 348, 348, 348, 348, 236, 236, 236,
236, 236, 236, 236, 236, 236, 236, 236,
236, 236, 236, 236, 236, 236, 236, 236,
236, 236, 236, 351, 351, 351, 351, 351,
351, 351, 351, 351, 351, 351, 351, 351,
351, 351, 351, 351, 351, 351, 573, 351,
351, 240, 240, 240, 240, 240, 240, 240,
240, 240, 240, 240, 240, 240, 240, 240,
240, 240, 240, 240, 573, 240, 240, 355,
355, 355, 355, 573, 573, 355, 355, 573,
573, 573, 355, 355, 362, 362, 362, 362,
573, 573, 362, 362, 573, 573, 573, 362,
362, 261, 261, 261, 573, 573, 573, 261,
261, 573, 573, 573, 261, 261, 378, 378,
378, 378, 573, 573, 378, 378, 573, 573,
573, 378, 378, 380, 380, 380, 380, 573,
573, 380, 380, 573, 573, 573, 380, 380,
386, 386, 386, 386, 573, 573, 386, 386,
573, 573, 573, 386, 386, 392, 392, 392,
392, 392, 392, 392, 392, 392, 392, 392,
392, 392, 392, 573, 392, 392, 392, 392,
392, 392, 392, 454, 454, 454, 454, 454,
454, 454, 454, 454, 454, 454, 454, 454,
454, 454, 454, 454, 454, 454, 454, 454,
454, 399, 399, 399, 573, 573, 573, 399,
399, 573, 573, 573, 399, 399, 400, 400,
400, 573, 573, 573, 400, 400, 573, 573,
573, 400, 400, 312, 312, 312, 312, 312,
312, 312, 312, 312, 312, 312, 312, 312,
312, 312, 312, 312, 312, 312, 312, 312,
312, 402, 402, 402, 402, 402, 402, 402,
402, 402, 402, 402, 402, 402, 402, 573,
402, 402, 402, 402, 573, 402, 402, 459,
459, 459, 459, 459, 459, 459, 459, 459,
459, 459, 459, 459, 459, 459, 459, 459,
459, 459, 573, 459, 459, 320, 320, 320,
320, 320, 320, 320, 320, 320, 320, 320,
320, 320, 320, 320, 320, 320, 320, 320,
573, 320, 320, 407, 407, 407, 407, 407,
407, 407, 407, 407, 407, 407, 407, 407,
407, 407, 573, 407, 407, 407, 407, 407,
407, 407, 327, 327, 327, 327, 327, 327,
327, 327, 327, 327, 327, 327, 327, 327,
327, 327, 327, 327, 327, 327, 327, 327,
327, 411, 411, 411, 411, 411, 411, 411,
411, 411, 411, 411, 411, 411, 411, 573,
411, 411, 411, 411, 411, 411, 411, 332,
332, 332, 332, 332, 332, 332, 332, 332,
332, 332, 332, 332, 332, 332, 332, 332,
332, 332, 332, 332, 332, 416, 416, 416,
416, 416, 416, 416, 416, 416, 416, 416,
416, 416, 416, 573, 416, 416, 416, 416,
573, 416, 416, 338, 338, 338, 338, 338,
338, 338, 338, 338, 338, 338, 338, 338,
338, 338, 338, 338, 338, 338, 573, 338,
338, 421, 421, 421, 421, 421, 421, 421,
421, 421, 421, 421, 421, 421, 421, 421,
573, 421, 421, 421, 421, 421, 421, 421,
344, 344, 344, 344, 344, 344, 344, 344,
344, 344, 344, 344, 344, 344, 344, 344,
344, 344, 344, 344, 344, 344, 344, 568,
568, 573, 573, 573, 573, 573, 573, 573,
573, 573, 568, 573, 573, 573, 568, 568,
573, 573, 573, 573, 568, 570, 570, 570,
573, 573, 573, 570, 570, 573, 573, 573,
570, 570, 571, 571, 573, 573, 573, 573,
573, 573, 573, 573, 573, 571, 573, 573,
573, 571, 571, 573, 573, 573, 573, 571,
572, 572, 572, 573, 573, 573, 572, 572,
573, 573, 573, 572, 572, 71, 573, 573,
573, 573, 573, 573, 573, 573, 573, 573,
573, 573, 573, 573, 573, 573, 573, 573,
573, 573, 573, 573, 573, 573, 573, 573,
573, 573, 573, 573, 573, 573, 573, 573,
573, 573, 573, 573, 573, 573, 573, 573,
573, 573, 573, 573, 573, 573, 573, 573,
573, 573, 573, 573, 573, 573, 573, 573,
573, 573, 573, 573, 573, 573, 573, 573,
573, 573, 573, 573, 573, 573);
YY_Chk : constant
array (Interfaces.Unsigned_32 range 0 .. 4869)
of Interfaces.Unsigned_32 :=
( 0, 0, 3, 3, 3, 0, 3, 0,
4, 4, 4, 3, 4, 5, 5, 5,
5, 4, 6, 6, 6, 6, 5, 114,
3, 19, 3, 6, 105, 105, 4, 11,
4, 107, 107, 5, 7, 7, 7, 7,
6, 12, 13, 14, 114, 7, 563, 17,
17, 17, 19, 8, 8, 8, 8, 142,
3, 142, 7, 15, 8, 223, 4, 5,
3, 20, 3, 16, 6, 21, 4, 17,
4, 8, 9, 9, 9, 10, 10, 10,
15, 11, 9, 22, 5, 10, 7, 223,
16, 6, 20, 12, 13, 14, 21, 9,
19, 157, 10, 57, 556, 8, 11, 157,
7, 84, 552, 7, 22, 550, 13, 14,
12, 13, 14, 18, 18, 18, 84, 8,
696, 57, 8, 9, 86, 696, 10, 23,
23, 23, 25, 25, 25, 24, 24, 24,
20, 21, 86, 18, 21, 26, 26, 26,
9, 86, 84, 10, 548, 57, 23, 22,
547, 25, 22, 116, 24, 90, 27, 27,
27, 28, 28, 28, 26, 27, 23, 58,
28, 23, 57, 90, 24, 94, 23, 24,
116, 25, 90, 27, 24, 546, 28, 29,
29, 29, 193, 94, 26, 58, 29, 30,
30, 30, 94, 33, 33, 33, 30, 67,
67, 67, 33, 67, 29, 33, 545, 27,
67, 300, 28, 300, 30, 75, 75, 75,
544, 58, 33, 358, 33, 358, 67, 543,
33, 69, 69, 69, 134, 69, 542, 134,
29, 193, 69, 102, 102, 102, 58, 134,
30, 31, 31, 31, 31, 31, 31, 31,
31, 31, 31, 31, 31, 31, 31, 31,
31, 31, 31, 31, 31, 31, 31, 31,
31, 31, 31, 31, 31, 31, 31, 31,
31, 31, 31, 31, 31, 31, 31, 31,
31, 31, 31, 31, 31, 31, 31, 31,
31, 31, 31, 31, 31, 31, 31, 31,
31, 31, 31, 31, 31, 31, 31, 31,
31, 31, 31, 31, 31, 31, 31, 31,
31, 34, 34, 34, 539, 68, 68, 68,
34, 68, 732, 34, 235, 235, 68, 732,
70, 70, 70, 538, 70, 108, 108, 108,
34, 70, 34, 384, 68, 384, 34, 35,
35, 35, 35, 35, 35, 35, 35, 35,
35, 35, 35, 35, 35, 35, 35, 35,
35, 35, 35, 35, 35, 35, 35, 35,
35, 35, 35, 35, 35, 35, 35, 35,
35, 35, 35, 35, 35, 35, 35, 35,
35, 35, 35, 35, 35, 35, 35, 35,
35, 35, 35, 35, 35, 35, 35, 35,
35, 35, 35, 35, 35, 35, 35, 35,
35, 35, 35, 35, 35, 35, 35, 37,
37, 37, 37, 37, 37, 37, 37, 37,
37, 37, 37, 37, 37, 37, 37, 37,
37, 37, 37, 37, 37, 37, 37, 37,
37, 37, 37, 37, 37, 37, 37, 37,
37, 37, 37, 37, 37, 37, 37, 37,
37, 37, 37, 37, 37, 37, 37, 37,
37, 37, 37, 37, 37, 37, 37, 37,
37, 37, 37, 37, 37, 37, 37, 37,
37, 37, 37, 37, 37, 37, 37, 39,
39, 39, 39, 39, 39, 39, 39, 39,
39, 39, 39, 39, 39, 39, 39, 39,
39, 39, 39, 39, 39, 39, 39, 39,
39, 39, 39, 39, 39, 39, 39, 39,
39, 39, 39, 39, 39, 39, 39, 39,
39, 39, 39, 39, 39, 39, 39, 39,
39, 39, 39, 39, 39, 39, 39, 39,
39, 39, 39, 39, 39, 39, 39, 39,
39, 39, 39, 39, 39, 39, 39, 41,
41, 41, 41, 41, 41, 41, 41, 41,
41, 41, 41, 41, 41, 41, 41, 41,
41, 41, 41, 41, 41, 41, 41, 41,
41, 41, 41, 41, 41, 41, 41, 41,
41, 41, 41, 41, 41, 41, 41, 41,
41, 41, 41, 41, 41, 41, 41, 41,
41, 41, 41, 41, 41, 41, 41, 41,
41, 41, 41, 41, 41, 41, 41, 41,
41, 41, 41, 41, 41, 41, 41, 43,
43, 43, 87, 44, 44, 44, 180, 180,
180, 227, 231, 330, 195, 239, 239, 87,
232, 232, 232, 242, 242, 242, 43, 349,
349, 195, 44, 352, 352, 557, 557, 557,
566, 566, 566, 227, 231, 330, 43, 537,
536, 43, 44, 87, 195, 44, 45, 45,
45, 45, 45, 45, 45, 45, 45, 45,
45, 45, 45, 45, 45, 45, 45, 45,
45, 45, 45, 45, 45, 45, 45, 45,
45, 45, 45, 45, 45, 45, 45, 45,
45, 45, 45, 45, 45, 45, 45, 45,
45, 45, 45, 45, 45, 45, 45, 45,
45, 45, 45, 45, 45, 45, 45, 45,
45, 45, 45, 45, 45, 45, 45, 45,
45, 45, 45, 45, 45, 45, 47, 47,
47, 89, 47, 91, 48, 48, 48, 47,
48, 483, 334, 535, 336, 48, 89, 735,
91, 735, 533, 340, 735, 47, 483, 567,
567, 567, 532, 48, 569, 569, 569, 531,
530, 529, 528, 47, 334, 47, 336, 526,
47, 48, 89, 48, 91, 340, 48, 49,
49, 49, 49, 49, 49, 49, 49, 49,
49, 49, 49, 49, 49, 49, 49, 49,
49, 49, 49, 49, 49, 49, 49, 49,
49, 49, 49, 49, 49, 49, 49, 49,
49, 49, 49, 49, 49, 49, 49, 49,
49, 49, 49, 49, 49, 49, 49, 49,
49, 49, 49, 49, 49, 49, 49, 49,
49, 49, 49, 49, 49, 49, 49, 49,
49, 49, 49, 49, 49, 49, 49, 51,
285, 59, 525, 522, 51, 52, 521, 51,
51, 51, 52, 53, 60, 52, 52, 52,
53, 54, 342, 53, 53, 53, 54, 59,
92, 54, 54, 54, 55, 55, 55, 56,
56, 56, 60, 55, 95, 92, 56, 207,
189, 216, 346, 191, 342, 199, 203, 285,
413, 95, 520, 59, 207, 189, 216, 516,
191, 515, 199, 203, 512, 55, 60, 511,
56, 92, 510, 508, 346, 59, 51, 207,
59, 216, 413, 55, 52, 95, 56, 53,
60, 189, 53, 60, 191, 54, 199, 203,
54, 61, 61, 61, 61, 61, 61, 61,
61, 61, 61, 61, 61, 61, 61, 61,
61, 61, 61, 61, 61, 61, 61, 61,
61, 61, 61, 61, 61, 61, 61, 61,
61, 61, 61, 61, 61, 61, 61, 61,
61, 61, 61, 61, 61, 61, 61, 61,
61, 61, 61, 61, 61, 61, 61, 61,
61, 61, 61, 61, 61, 61, 61, 61,
61, 61, 61, 61, 61, 61, 61, 61,
61, 63, 507, 64, 414, 506, 63, 505,
64, 65, 63, 63, 64, 64, 65, 418,
205, 66, 65, 65, 504, 501, 66, 63,
500, 64, 66, 66, 246, 205, 414, 65,
83, 83, 83, 88, 88, 88, 246, 66,
83, 418, 246, 88, 93, 93, 93, 188,
188, 188, 246, 201, 93, 83, 208, 188,
88, 205, 210, 499, 246, 202, 202, 202,
201, 93, 201, 208, 188, 202, 211, 210,
63, 210, 64, 498, 213, 65, 217, 497,
65, 83, 202, 211, 88, 66, 496, 419,
66, 213, 219, 217, 201, 93, 298, 208,
188, 423, 495, 210, 214, 214, 214, 219,
248, 219, 424, 298, 214, 299, 202, 211,
311, 419, 248, 312, 314, 213, 248, 217,
319, 214, 299, 423, 299, 311, 248, 313,
312, 314, 315, 219, 424, 319, 320, 298,
248, 494, 322, 321, 313, 466, 313, 315,
493, 315, 491, 320, 490, 214, 299, 322,
321, 311, 321, 488, 312, 314, 487, 323,
326, 319, 468, 327, 392, 486, 470, 466,
313, 328, 393, 315, 323, 326, 323, 320,
327, 392, 401, 322, 321, 402, 328, 393,
328, 393, 485, 484, 468, 481, 407, 401,
470, 401, 402, 480, 479, 478, 476, 403,
323, 326, 406, 407, 327, 392, 475, 474,
408, 473, 328, 393, 403, 410, 403, 406,
472, 406, 471, 401, 458, 408, 402, 408,
462, 463, 410, 461, 410, 464, 460, 407,
459, 458, 457, 458, 456, 462, 455, 462,
403, 454, 464, 406, 464, 452, 451, 450,
448, 408, 446, 445, 444, 443, 410, 442,
441, 440, 439, 438, 437, 458, 436, 435,
434, 462, 433, 432, 431, 430, 464, 574,
574, 574, 574, 574, 574, 574, 574, 574,
574, 574, 574, 574, 574, 574, 574, 574,
574, 574, 574, 574, 574, 574, 574, 575,
575, 575, 575, 575, 575, 575, 575, 575,
575, 575, 575, 575, 575, 575, 575, 575,
575, 575, 575, 575, 575, 575, 575, 576,
576, 576, 576, 576, 576, 576, 576, 576,
576, 576, 576, 576, 576, 576, 576, 576,
576, 576, 576, 576, 576, 576, 576, 577,
577, 577, 577, 577, 577, 577, 577, 577,
577, 577, 577, 577, 577, 577, 577, 577,
577, 577, 577, 577, 577, 577, 577, 578,
578, 578, 578, 578, 578, 578, 578, 578,
578, 578, 578, 578, 578, 578, 578, 578,
578, 578, 578, 578, 578, 578, 578, 579,
579, 579, 579, 579, 579, 579, 579, 579,
579, 579, 579, 579, 579, 579, 579, 579,
579, 579, 579, 579, 579, 579, 579, 580,
580, 580, 580, 580, 580, 580, 580, 580,
580, 580, 580, 580, 580, 580, 580, 580,
580, 580, 580, 580, 580, 580, 580, 581,
581, 581, 581, 581, 581, 581, 581, 581,
581, 581, 581, 581, 581, 581, 581, 581,
581, 581, 581, 581, 581, 581, 581, 582,
582, 582, 582, 582, 582, 582, 582, 582,
582, 582, 582, 582, 582, 582, 582, 582,
582, 582, 582, 582, 582, 582, 582, 583,
583, 583, 583, 583, 583, 583, 583, 583,
583, 583, 583, 583, 583, 583, 583, 583,
583, 583, 583, 583, 583, 583, 583, 584,
584, 584, 584, 584, 584, 584, 584, 584,
584, 584, 584, 584, 584, 584, 584, 584,
584, 584, 584, 584, 584, 584, 584, 585,
585, 585, 585, 585, 585, 585, 585, 585,
585, 585, 585, 585, 585, 585, 585, 585,
585, 585, 585, 585, 585, 585, 585, 586,
586, 586, 586, 586, 586, 586, 586, 586,
586, 586, 586, 586, 586, 586, 586, 586,
586, 586, 586, 586, 586, 586, 586, 587,
587, 587, 587, 587, 587, 587, 587, 587,
587, 587, 587, 587, 587, 587, 587, 587,
587, 587, 587, 587, 587, 587, 587, 588,
588, 588, 588, 588, 588, 588, 588, 588,
588, 588, 588, 588, 588, 588, 588, 588,
588, 588, 588, 588, 588, 588, 588, 589,
589, 589, 589, 589, 589, 589, 589, 589,
589, 589, 589, 589, 589, 589, 589, 589,
589, 589, 589, 589, 589, 589, 589, 590,
429, 428, 427, 426, 421, 590, 590, 416,
411, 409, 405, 590, 590, 591, 591, 591,
404, 398, 397, 396, 591, 591, 592, 592,
592, 592, 592, 592, 592, 592, 592, 592,
592, 592, 592, 592, 592, 592, 592, 592,
592, 592, 592, 592, 593, 395, 391, 390,
389, 388, 386, 593, 383, 382, 380, 593,
593, 378, 377, 376, 375, 593, 594, 374,
373, 372, 371, 370, 369, 368, 367, 594,
366, 365, 362, 594, 594, 359, 357, 355,
354, 594, 595, 595, 595, 595, 595, 595,
595, 595, 595, 595, 595, 595, 595, 595,
595, 595, 595, 595, 595, 595, 595, 595,
596, 596, 596, 596, 596, 596, 596, 596,
596, 596, 596, 596, 596, 596, 596, 596,
596, 596, 596, 353, 596, 596, 597, 597,
597, 597, 597, 597, 597, 597, 597, 597,
597, 597, 597, 597, 597, 597, 597, 597,
597, 351, 597, 597, 598, 598, 598, 598,
598, 598, 598, 598, 598, 598, 598, 598,
598, 598, 598, 598, 598, 598, 598, 598,
598, 598, 598, 599, 599, 599, 599, 599,
599, 599, 599, 599, 599, 599, 599, 599,
599, 599, 599, 599, 599, 599, 599, 599,
599, 599, 600, 600, 600, 600, 600, 600,
600, 600, 600, 600, 600, 600, 600, 600,
600, 600, 600, 600, 600, 600, 600, 600,
601, 601, 601, 601, 601, 601, 601, 601,
601, 601, 601, 601, 601, 601, 601, 601,
601, 601, 601, 601, 601, 601, 602, 602,
602, 602, 602, 602, 602, 602, 602, 602,
602, 602, 602, 602, 602, 602, 602, 602,
602, 348, 602, 602, 603, 603, 603, 603,
603, 603, 603, 603, 603, 603, 603, 603,
603, 603, 603, 603, 603, 603, 603, 344,
603, 603, 604, 604, 604, 604, 604, 604,
604, 604, 604, 604, 604, 604, 604, 604,
604, 604, 604, 604, 604, 604, 604, 604,
604, 605, 605, 605, 605, 605, 605, 605,
605, 605, 605, 605, 605, 605, 605, 605,
605, 605, 605, 605, 605, 605, 605, 605,
606, 606, 606, 606, 606, 606, 606, 606,
606, 606, 606, 606, 606, 606, 606, 606,
606, 606, 606, 606, 606, 606, 607, 607,
607, 607, 607, 607, 607, 607, 607, 607,
607, 607, 607, 607, 607, 607, 607, 607,
607, 607, 607, 607, 608, 608, 608, 608,
608, 608, 608, 608, 608, 608, 608, 608,
608, 608, 608, 608, 608, 608, 608, 343,
608, 608, 609, 609, 609, 609, 609, 609,
609, 609, 609, 609, 609, 609, 609, 609,
609, 609, 609, 609, 609, 341, 609, 609,
610, 338, 337, 335, 610, 610, 332, 331,
329, 324, 610, 611, 317, 316, 306, 611,
611, 305, 304, 302, 297, 611, 612, 612,
612, 296, 295, 294, 612, 612, 293, 291,
290, 612, 612, 613, 613, 613, 288, 286,
281, 613, 613, 279, 277, 276, 613, 613,
614, 614, 614, 274, 273, 270, 614, 614,
268, 267, 266, 614, 614, 615, 615, 615,
265, 264, 263, 615, 615, 262, 259, 258,
615, 615, 616, 616, 616, 257, 253, 252,
616, 616, 251, 249, 247, 616, 616, 617,
617, 617, 245, 244, 243, 617, 617, 240,
238, 236, 617, 617, 618, 618, 618, 234,
230, 229, 618, 618, 228, 226, 225, 618,
618, 619, 619, 619, 224, 222, 221, 619,
619, 220, 194, 187, 619, 619, 620, 620,
620, 186, 620, 620, 185, 183, 182, 620,
620, 620, 620, 620, 620, 620, 620, 620,
620, 620, 620, 620, 621, 179, 178, 177,
621, 621, 175, 174, 171, 166, 621, 622,
164, 163, 161, 160, 155, 150, 622, 146,
145, 141, 622, 622, 140, 139, 123, 122,
622, 623, 623, 623, 121, 623, 623, 115,
111, 110, 623, 623, 623, 623, 623, 623,
623, 623, 623, 623, 106, 623, 623, 624,
624, 624, 624, 624, 624, 624, 624, 624,
624, 624, 624, 624, 104, 624, 624, 624,
624, 103, 624, 624, 624, 625, 625, 625,
625, 625, 625, 625, 625, 625, 625, 625,
625, 625, 101, 625, 625, 625, 625, 100,
99, 625, 625, 626, 626, 626, 98, 97,
96, 626, 626, 85, 82, 81, 626, 626,
627, 627, 627, 80, 627, 627, 627, 79,
77, 627, 627, 627, 627, 76, 627, 627,
627, 627, 627, 627, 627, 627, 628, 73,
71, 2, 1, 0, 0, 628, 0, 0,
0, 628, 628, 0, 0, 0, 0, 628,
629, 629, 629, 0, 629, 629, 629, 0,
0, 629, 629, 629, 629, 0, 629, 629,
629, 629, 629, 0, 629, 629, 630, 630,
630, 630, 630, 630, 630, 630, 630, 630,
630, 630, 630, 630, 630, 630, 630, 630,
630, 630, 630, 630, 630, 630, 631, 631,
631, 631, 631, 631, 631, 631, 631, 631,
631, 631, 631, 631, 631, 631, 631, 631,
631, 631, 631, 631, 631, 631, 632, 632,
632, 632, 632, 632, 0, 632, 632, 632,
632, 632, 0, 0, 632, 632, 633, 633,
0, 633, 633, 633, 0, 633, 633, 633,
633, 633, 0, 0, 633, 633, 634, 0,
0, 0, 0, 0, 634, 634, 0, 0,
0, 0, 634, 634, 635, 635, 635, 0,
0, 0, 0, 635, 635, 636, 636, 636,
636, 636, 636, 636, 636, 636, 636, 636,
636, 636, 636, 636, 636, 636, 636, 636,
636, 636, 636, 637, 637, 637, 637, 637,
637, 637, 637, 637, 637, 637, 637, 637,
637, 637, 637, 637, 637, 637, 637, 637,
637, 638, 638, 638, 638, 0, 0, 638,
638, 0, 0, 0, 638, 638, 639, 0,
0, 0, 639, 639, 0, 0, 0, 0,
639, 640, 640, 640, 0, 0, 0, 640,
640, 0, 0, 0, 640, 640, 641, 0,
0, 0, 641, 641, 0, 0, 0, 0,
641, 642, 642, 642, 642, 642, 642, 642,
642, 642, 642, 642, 642, 642, 642, 642,
642, 642, 642, 642, 642, 642, 642, 643,
643, 643, 643, 643, 643, 643, 643, 643,
643, 643, 643, 643, 643, 643, 643, 643,
643, 643, 643, 643, 643, 644, 644, 644,
644, 644, 644, 644, 644, 644, 644, 644,
644, 644, 644, 644, 644, 644, 644, 644,
0, 644, 644, 645, 645, 645, 645, 645,
645, 645, 645, 645, 645, 645, 645, 645,
645, 645, 645, 645, 645, 645, 0, 645,
645, 646, 646, 646, 646, 646, 646, 646,
646, 646, 646, 646, 646, 646, 646, 646,
646, 646, 646, 646, 0, 646, 646, 647,
647, 647, 647, 647, 647, 647, 647, 647,
647, 647, 647, 647, 647, 647, 647, 647,
647, 647, 0, 647, 647, 648, 648, 648,
648, 648, 648, 648, 648, 648, 648, 648,
648, 648, 648, 648, 648, 648, 648, 648,
648, 648, 648, 648, 649, 649, 649, 649,
649, 649, 649, 649, 649, 649, 649, 649,
649, 649, 649, 649, 649, 649, 649, 649,
649, 649, 649, 650, 650, 650, 650, 650,
650, 650, 650, 650, 650, 650, 650, 650,
650, 650, 650, 650, 650, 650, 650, 650,
650, 650, 651, 651, 651, 651, 651, 651,
651, 651, 651, 651, 651, 651, 651, 651,
651, 651, 651, 651, 651, 651, 651, 651,
651, 652, 652, 652, 652, 652, 652, 652,
652, 652, 652, 652, 652, 652, 652, 652,
652, 652, 652, 652, 652, 652, 652, 653,
653, 653, 653, 653, 653, 653, 653, 653,
653, 653, 653, 653, 653, 653, 653, 653,
653, 653, 653, 653, 653, 654, 654, 654,
654, 654, 654, 654, 654, 654, 654, 654,
654, 654, 654, 654, 654, 654, 654, 654,
654, 654, 654, 655, 655, 655, 655, 655,
655, 655, 655, 655, 655, 655, 655, 655,
655, 655, 655, 655, 655, 655, 655, 655,
655, 656, 656, 656, 656, 656, 656, 656,
656, 656, 656, 656, 656, 656, 656, 656,
656, 656, 656, 656, 0, 656, 656, 657,
657, 657, 657, 657, 657, 657, 657, 657,
657, 657, 657, 657, 657, 657, 657, 657,
657, 657, 0, 657, 657, 658, 658, 658,
658, 658, 658, 658, 658, 658, 658, 658,
658, 658, 658, 658, 658, 658, 658, 658,
0, 658, 658, 659, 659, 659, 659, 659,
659, 659, 659, 659, 659, 659, 659, 659,
659, 659, 659, 659, 659, 659, 0, 659,
659, 660, 660, 660, 660, 660, 660, 660,
660, 660, 660, 660, 660, 660, 660, 660,
660, 660, 660, 660, 660, 660, 660, 660,
661, 661, 661, 661, 661, 661, 661, 661,
661, 661, 661, 661, 661, 661, 661, 661,
661, 661, 661, 661, 661, 661, 661, 662,
662, 662, 662, 662, 662, 662, 662, 662,
662, 662, 662, 662, 662, 662, 662, 662,
662, 662, 662, 662, 662, 662, 663, 663,
663, 663, 663, 663, 663, 663, 663, 663,
663, 663, 663, 663, 663, 663, 663, 663,
663, 663, 663, 663, 663, 664, 664, 664,
664, 664, 664, 664, 664, 664, 664, 664,
664, 664, 664, 664, 664, 664, 664, 664,
664, 664, 664, 665, 665, 665, 665, 665,
665, 665, 665, 665, 665, 665, 665, 665,
665, 665, 665, 665, 665, 665, 665, 665,
665, 666, 666, 666, 666, 666, 666, 666,
666, 666, 666, 666, 666, 666, 666, 666,
666, 666, 666, 666, 666, 666, 666, 667,
667, 667, 667, 667, 667, 667, 667, 667,
667, 667, 667, 667, 667, 667, 667, 667,
667, 667, 0, 667, 667, 668, 668, 668,
668, 668, 668, 668, 668, 668, 668, 668,
668, 668, 668, 668, 668, 668, 668, 668,
0, 668, 668, 669, 669, 669, 669, 669,
669, 669, 669, 669, 669, 669, 669, 669,
669, 669, 669, 669, 669, 669, 0, 669,
669, 670, 670, 670, 670, 0, 0, 670,
670, 0, 0, 0, 670, 670, 671, 671,
671, 671, 0, 0, 671, 671, 0, 0,
0, 671, 671, 672, 672, 672, 0, 0,
0, 672, 672, 0, 0, 0, 672, 672,
673, 673, 673, 0, 0, 0, 673, 673,
0, 0, 0, 673, 673, 674, 674, 674,
0, 0, 0, 674, 674, 0, 0, 0,
674, 674, 675, 675, 675, 0, 0, 0,
675, 675, 0, 0, 0, 675, 675, 676,
676, 676, 0, 0, 0, 676, 676, 0,
0, 0, 676, 676, 677, 677, 677, 0,
0, 0, 677, 677, 0, 0, 0, 677,
677, 678, 678, 678, 0, 0, 0, 678,
678, 0, 0, 0, 678, 678, 679, 679,
679, 0, 0, 0, 679, 679, 0, 0,
0, 679, 679, 680, 680, 680, 0, 680,
680, 0, 0, 0, 680, 680, 680, 680,
680, 680, 680, 680, 680, 680, 680, 680,
680, 681, 681, 681, 681, 0, 0, 681,
681, 0, 0, 0, 681, 681, 682, 682,
682, 682, 0, 0, 682, 682, 0, 0,
0, 682, 682, 683, 683, 683, 0, 683,
683, 0, 0, 0, 683, 683, 683, 683,
683, 683, 683, 683, 683, 683, 0, 683,
683, 684, 684, 684, 684, 684, 684, 684,
684, 684, 684, 684, 684, 684, 0, 684,
684, 684, 684, 0, 684, 684, 684, 685,
685, 685, 685, 685, 685, 685, 685, 685,
685, 685, 685, 685, 0, 685, 685, 685,
685, 0, 0, 685, 685, 686, 686, 686,
0, 0, 0, 686, 686, 0, 0, 0,
686, 686, 687, 687, 687, 0, 687, 687,
687, 0, 0, 687, 687, 687, 687, 0,
687, 687, 687, 687, 687, 687, 687, 687,
688, 688, 688, 688, 0, 0, 688, 688,
0, 0, 0, 688, 688, 689, 689, 689,
0, 689, 689, 689, 0, 0, 689, 689,
689, 689, 0, 689, 689, 689, 689, 689,
0, 689, 689, 690, 690, 690, 690, 690,
690, 690, 690, 690, 690, 690, 690, 690,
690, 690, 690, 690, 690, 690, 690, 690,
690, 690, 690, 691, 691, 691, 691, 691,
691, 691, 691, 691, 691, 691, 691, 691,
691, 691, 691, 691, 691, 691, 691, 691,
691, 691, 691, 692, 692, 692, 692, 692,
692, 0, 692, 692, 692, 692, 692, 0,
0, 692, 692, 693, 693, 0, 693, 693,
693, 0, 693, 693, 693, 693, 693, 0,
0, 693, 693, 694, 694, 694, 694, 694,
694, 694, 694, 694, 694, 694, 694, 694,
694, 694, 694, 694, 694, 694, 694, 694,
694, 695, 695, 695, 695, 695, 695, 695,
695, 695, 695, 695, 695, 695, 695, 695,
695, 695, 695, 695, 695, 695, 695, 697,
697, 697, 697, 0, 0, 697, 697, 0,
0, 0, 697, 697, 698, 698, 698, 0,
0, 0, 698, 698, 0, 0, 0, 698,
698, 699, 699, 699, 0, 0, 0, 699,
699, 0, 0, 0, 699, 699, 700, 700,
700, 0, 0, 0, 700, 700, 0, 0,
0, 700, 700, 701, 701, 701, 701, 701,
701, 701, 701, 701, 701, 701, 701, 701,
701, 701, 701, 701, 701, 701, 701, 701,
701, 702, 702, 702, 702, 702, 702, 702,
702, 702, 702, 702, 702, 702, 702, 0,
702, 702, 702, 702, 702, 702, 702, 703,
703, 703, 703, 703, 703, 703, 703, 703,
703, 703, 703, 703, 703, 703, 703, 703,
703, 703, 0, 703, 703, 704, 704, 704,
704, 704, 704, 704, 704, 704, 704, 704,
704, 704, 704, 704, 704, 704, 704, 704,
0, 704, 704, 705, 705, 705, 705, 705,
705, 705, 705, 705, 705, 705, 705, 705,
705, 705, 705, 705, 705, 705, 0, 705,
705, 706, 706, 706, 706, 706, 706, 706,
706, 706, 706, 706, 706, 706, 706, 0,
706, 706, 706, 706, 0, 706, 706, 707,
707, 707, 707, 707, 707, 707, 707, 707,
707, 707, 707, 707, 707, 707, 707, 707,
707, 707, 707, 707, 707, 707, 708, 708,
708, 708, 708, 708, 708, 708, 708, 708,
708, 708, 708, 708, 708, 708, 708, 708,
708, 708, 708, 708, 708, 709, 709, 709,
709, 709, 709, 709, 709, 709, 709, 709,
709, 709, 709, 709, 709, 709, 709, 709,
709, 709, 709, 709, 710, 710, 710, 710,
710, 710, 710, 710, 710, 710, 710, 710,
710, 710, 710, 0, 710, 710, 710, 710,
710, 710, 710, 711, 711, 711, 711, 711,
711, 711, 711, 711, 711, 711, 711, 711,
711, 711, 711, 711, 711, 711, 711, 711,
711, 712, 712, 712, 712, 712, 712, 712,
712, 712, 712, 712, 712, 712, 712, 712,
712, 712, 712, 712, 712, 712, 712, 713,
713, 713, 713, 713, 713, 713, 713, 713,
713, 713, 713, 713, 713, 713, 713, 713,
713, 713, 713, 713, 713, 714, 714, 714,
714, 714, 714, 714, 714, 714, 714, 714,
714, 714, 714, 0, 714, 714, 714, 714,
714, 714, 714, 715, 715, 715, 715, 715,
715, 715, 715, 715, 715, 715, 715, 715,
715, 715, 715, 715, 715, 715, 0, 715,
715, 716, 716, 716, 716, 716, 716, 716,
716, 716, 716, 716, 716, 716, 716, 716,
716, 716, 716, 716, 0, 716, 716, 717,
717, 717, 717, 717, 717, 717, 717, 717,
717, 717, 717, 717, 717, 717, 717, 717,
717, 717, 0, 717, 717, 718, 718, 718,
718, 718, 718, 718, 718, 718, 718, 718,
718, 718, 718, 0, 718, 718, 718, 718,
0, 718, 718, 719, 719, 719, 719, 719,
719, 719, 719, 719, 719, 719, 719, 719,
719, 719, 719, 719, 719, 719, 719, 719,
719, 719, 720, 720, 720, 720, 720, 720,
720, 720, 720, 720, 720, 720, 720, 720,
720, 720, 720, 720, 720, 720, 720, 720,
720, 721, 721, 721, 721, 721, 721, 721,
721, 721, 721, 721, 721, 721, 721, 721,
721, 721, 721, 721, 721, 721, 721, 721,
722, 722, 722, 722, 722, 722, 722, 722,
722, 722, 722, 722, 722, 722, 722, 0,
722, 722, 722, 722, 722, 722, 722, 723,
723, 723, 723, 723, 723, 723, 723, 723,
723, 723, 723, 723, 723, 723, 723, 723,
723, 723, 723, 723, 723, 724, 724, 724,
724, 724, 724, 724, 724, 724, 724, 724,
724, 724, 724, 724, 724, 724, 724, 724,
724, 724, 724, 725, 725, 725, 725, 725,
725, 725, 725, 725, 725, 725, 725, 725,
725, 725, 725, 725, 725, 725, 0, 725,
725, 726, 726, 726, 726, 726, 726, 726,
726, 726, 726, 726, 726, 726, 726, 726,
726, 726, 726, 726, 0, 726, 726, 727,
727, 727, 727, 0, 0, 727, 727, 0,
0, 0, 727, 727, 728, 728, 728, 728,
0, 0, 728, 728, 0, 0, 0, 728,
728, 729, 729, 729, 0, 0, 0, 729,
729, 0, 0, 0, 729, 729, 730, 730,
730, 730, 0, 0, 730, 730, 0, 0,
0, 730, 730, 731, 731, 731, 731, 0,
0, 731, 731, 0, 0, 0, 731, 731,
733, 733, 733, 733, 0, 0, 733, 733,
0, 0, 0, 733, 733, 734, 734, 734,
734, 734, 734, 734, 734, 734, 734, 734,
734, 734, 734, 0, 734, 734, 734, 734,
734, 734, 734, 736, 736, 736, 736, 736,
736, 736, 736, 736, 736, 736, 736, 736,
736, 736, 736, 736, 736, 736, 736, 736,
736, 737, 737, 737, 0, 0, 0, 737,
737, 0, 0, 0, 737, 737, 738, 738,
738, 0, 0, 0, 738, 738, 0, 0,
0, 738, 738, 739, 739, 739, 739, 739,
739, 739, 739, 739, 739, 739, 739, 739,
739, 739, 739, 739, 739, 739, 739, 739,
739, 740, 740, 740, 740, 740, 740, 740,
740, 740, 740, 740, 740, 740, 740, 0,
740, 740, 740, 740, 0, 740, 740, 741,
741, 741, 741, 741, 741, 741, 741, 741,
741, 741, 741, 741, 741, 741, 741, 741,
741, 741, 0, 741, 741, 742, 742, 742,
742, 742, 742, 742, 742, 742, 742, 742,
742, 742, 742, 742, 742, 742, 742, 742,
0, 742, 742, 743, 743, 743, 743, 743,
743, 743, 743, 743, 743, 743, 743, 743,
743, 743, 0, 743, 743, 743, 743, 743,
743, 743, 744, 744, 744, 744, 744, 744,
744, 744, 744, 744, 744, 744, 744, 744,
744, 744, 744, 744, 744, 744, 744, 744,
744, 745, 745, 745, 745, 745, 745, 745,
745, 745, 745, 745, 745, 745, 745, 0,
745, 745, 745, 745, 745, 745, 745, 746,
746, 746, 746, 746, 746, 746, 746, 746,
746, 746, 746, 746, 746, 746, 746, 746,
746, 746, 746, 746, 746, 747, 747, 747,
747, 747, 747, 747, 747, 747, 747, 747,
747, 747, 747, 0, 747, 747, 747, 747,
0, 747, 747, 748, 748, 748, 748, 748,
748, 748, 748, 748, 748, 748, 748, 748,
748, 748, 748, 748, 748, 748, 0, 748,
748, 749, 749, 749, 749, 749, 749, 749,
749, 749, 749, 749, 749, 749, 749, 749,
0, 749, 749, 749, 749, 749, 749, 749,
750, 750, 750, 750, 750, 750, 750, 750,
750, 750, 750, 750, 750, 750, 750, 750,
750, 750, 750, 750, 750, 750, 750, 751,
751, 0, 0, 0, 0, 0, 0, 0,
0, 0, 751, 0, 0, 0, 751, 751,
0, 0, 0, 0, 751, 752, 752, 752,
0, 0, 0, 752, 752, 0, 0, 0,
752, 752, 753, 753, 0, 0, 0, 0,
0, 0, 0, 0, 0, 753, 0, 0,
0, 753, 753, 0, 0, 0, 0, 753,
754, 754, 754, 0, 0, 0, 754, 754,
0, 0, 0, 754, 754, 573, 573, 573,
573, 573, 573, 573, 573, 573, 573, 573,
573, 573, 573, 573, 573, 573, 573, 573,
573, 573, 573, 573, 573, 573, 573, 573,
573, 573, 573, 573, 573, 573, 573, 573,
573, 573, 573, 573, 573, 573, 573, 573,
573, 573, 573, 573, 573, 573, 573, 573,
573, 573, 573, 573, 573, 573, 573, 573,
573, 573, 573, 573, 573, 573, 573, 573,
573, 573, 573, 573, 573, 573);
YY_EC_0000 : aliased constant YY_Secondary_Array :=
( 72, 1, 1, 1, 1, 1, 1, 1,
1, 2, 3, 1, 1, 4, 1, 1,
1, 1, 1, 1, 1, 1, 1, 1,
1, 1, 1, 1, 1, 1, 1, 1,
4, 5, 6, 7, 8, 9, 10, 11,
12, 13, 14, 15, 16, 17, 18, 19,
20, 20, 20, 20, 20, 20, 20, 20,
20, 20, 21, 22, 23, 24, 25, 26,
8, 27, 28, 29, 30, 31, 32, 33,
34, 35, 34, 36, 37, 38, 39, 40,
41, 42, 43, 44, 45, 46, 34, 34,
47, 48, 34, 49, 50, 51, 50, 34,
50, 52, 53, 54, 55, 56, 53, 57,
34, 58, 34, 34, 59, 60, 61, 62,
34, 34, 63, 64, 65, 34, 66, 34,
67, 34, 34, 50, 68, 50, 50, 69,
69, 69, 69, 69, 69, 50, 69, 69,
69, 69, 69, 69, 69, 69, 69, 69,
69, 69, 69, 69, 69, 69, 69, 69,
69, 69, 69, 69, 69, 69, 69, 69,
50, 50, 50, 50, 50, 50, 50, 50,
50, 50, 50, 50, 50, 50, 50, 50,
50, 50, 50, 50, 50, 50, 50, 70,
50, 50, 50, 50, 50, 50, 50, 50,
71, 71, 71, 71, 71, 71, 71, 71,
71, 71, 71, 71, 71, 71, 71, 71,
71, 71, 71, 71, 71, 71, 71, 50,
71, 71, 71, 71, 71, 71, 71, 71,
71, 71, 71, 71, 71, 71, 71, 71,
71, 71, 71, 71, 71, 71, 71, 71,
71, 71, 71, 71, 71, 71, 71, 50,
71, 71, 71, 71, 71, 71, 71, 71);
YY_EC_0001 : aliased constant YY_Secondary_Array :=
( 71, 71, 71, 71, 71, 71, 71, 71,
71, 71, 71, 71, 71, 71, 71, 71,
71, 71, 71, 71, 71, 71, 71, 71,
71, 71, 71, 71, 71, 71, 71, 71,
71, 71, 71, 71, 71, 71, 71, 71,
71, 71, 71, 71, 71, 71, 71, 71,
71, 71, 71, 71, 71, 71, 71, 71,
71, 71, 71, 71, 71, 71, 71, 71,
71, 71, 71, 71, 71, 71, 71, 71,
71, 71, 71, 71, 71, 71, 71, 71,
71, 71, 71, 71, 71, 71, 71, 71,
71, 71, 71, 71, 71, 71, 71, 71,
71, 71, 71, 71, 71, 71, 71, 71,
71, 71, 71, 71, 71, 71, 71, 71,
71, 71, 71, 71, 71, 71, 71, 71,
71, 71, 71, 71, 71, 71, 71, 71,
71, 71, 71, 71, 71, 71, 71, 71,
71, 71, 71, 71, 71, 71, 71, 71,
71, 71, 71, 71, 71, 71, 71, 71,
71, 71, 71, 71, 71, 71, 71, 71,
71, 71, 71, 71, 71, 71, 71, 71,
71, 71, 71, 71, 71, 71, 71, 71,
71, 71, 71, 71, 71, 71, 71, 71,
71, 71, 71, 71, 71, 71, 71, 71,
71, 71, 71, 71, 71, 71, 71, 71,
71, 71, 71, 71, 71, 71, 71, 71,
71, 71, 71, 71, 71, 71, 71, 71,
71, 71, 71, 71, 71, 71, 71, 71,
71, 71, 71, 71, 71, 71, 71, 71,
71, 71, 71, 71, 71, 71, 71, 71,
71, 71, 71, 71, 71, 71, 71, 71,
71, 71, 71, 71, 71, 71, 71, 71);
YY_EC_0003 : aliased constant YY_Secondary_Array :=
( 70, 70, 70, 70, 70, 70, 70, 70,
70, 70, 70, 70, 70, 70, 70, 70,
70, 70, 70, 70, 70, 70, 70, 70,
70, 70, 70, 70, 70, 70, 70, 70,
70, 70, 70, 70, 70, 70, 70, 70,
70, 70, 70, 70, 70, 70, 70, 70,
70, 70, 70, 70, 70, 70, 70, 70,
70, 70, 70, 70, 70, 70, 70, 70,
70, 70, 70, 70, 70, 70, 70, 70,
70, 70, 70, 70, 70, 70, 70, 70,
70, 70, 70, 70, 70, 70, 70, 70,
70, 70, 70, 70, 70, 70, 70, 70,
70, 70, 70, 70, 70, 70, 70, 70,
70, 70, 70, 70, 70, 70, 70, 70,
71, 71, 71, 71, 71, 71, 71, 71,
71, 71, 71, 71, 71, 71, 50, 71,
71, 71, 71, 71, 71, 71, 71, 71,
71, 71, 71, 71, 71, 71, 71, 71,
71, 71, 71, 71, 71, 71, 71, 71,
71, 71, 71, 71, 71, 71, 71, 71,
71, 71, 71, 71, 71, 71, 71, 71,
71, 71, 71, 71, 71, 71, 71, 71,
71, 71, 71, 71, 71, 71, 71, 71,
71, 71, 71, 71, 71, 71, 71, 71,
71, 71, 71, 71, 71, 71, 71, 71,
71, 71, 71, 71, 71, 71, 71, 71,
71, 71, 71, 71, 71, 71, 71, 71,
71, 71, 71, 71, 71, 71, 71, 71,
71, 71, 71, 71, 71, 71, 71, 71,
71, 71, 71, 71, 71, 71, 71, 71,
71, 71, 71, 71, 71, 71, 71, 71,
71, 71, 71, 71, 71, 71, 71, 71);
YY_EC_0020 : aliased constant YY_Secondary_Array :=
( 50, 50, 50, 50, 50, 50, 50, 50,
50, 50, 50, 50, 71, 71, 50, 50,
50, 50, 50, 50, 50, 50, 50, 50,
50, 50, 50, 50, 50, 50, 50, 50,
50, 50, 50, 50, 50, 50, 50, 50,
50, 50, 50, 50, 50, 50, 50, 50,
50, 50, 50, 50, 50, 50, 50, 50,
50, 50, 50, 50, 50, 50, 50, 70,
70, 50, 50, 50, 50, 50, 50, 50,
50, 50, 50, 50, 50, 50, 50, 50,
50, 50, 50, 50, 50, 50, 50, 50,
50, 50, 50, 50, 50, 50, 50, 50,
50, 50, 50, 50, 50, 50, 50, 50,
50, 50, 50, 50, 50, 50, 50, 50,
71, 71, 71, 71, 71, 71, 71, 71,
71, 71, 71, 71, 71, 71, 71, 71,
71, 71, 71, 71, 71, 71, 71, 71,
71, 71, 71, 71, 71, 71, 71, 71,
71, 71, 71, 71, 71, 71, 71, 71,
71, 71, 71, 71, 71, 71, 71, 71,
71, 71, 71, 71, 71, 71, 71, 71,
71, 71, 71, 71, 71, 71, 71, 71,
71, 71, 71, 71, 71, 71, 71, 71,
71, 71, 71, 71, 71, 71, 71, 71,
71, 71, 71, 71, 71, 71, 71, 71,
71, 71, 71, 71, 71, 71, 71, 71,
71, 71, 71, 71, 71, 71, 71, 71,
71, 71, 71, 71, 71, 71, 71, 71,
71, 71, 71, 71, 71, 71, 71, 71,
71, 71, 71, 71, 71, 71, 71, 71,
71, 71, 71, 71, 71, 71, 71, 71,
71, 71, 71, 71, 71, 71, 71, 71);
YY_EC_0021 : aliased constant YY_Secondary_Array :=
( 71, 71, 71, 71, 71, 71, 71, 71,
71, 71, 71, 71, 71, 71, 71, 71,
71, 71, 71, 71, 71, 71, 71, 71,
71, 71, 71, 71, 71, 71, 71, 71,
71, 71, 71, 71, 71, 71, 71, 71,
71, 71, 71, 71, 71, 71, 71, 71,
71, 71, 71, 71, 71, 71, 71, 71,
71, 71, 71, 71, 71, 71, 71, 71,
71, 71, 71, 71, 71, 71, 71, 71,
71, 71, 71, 71, 71, 71, 71, 71,
71, 71, 71, 71, 71, 71, 71, 71,
71, 71, 71, 71, 71, 71, 71, 71,
71, 71, 71, 71, 71, 71, 71, 71,
71, 71, 71, 71, 71, 71, 71, 71,
71, 71, 71, 71, 71, 71, 71, 71,
71, 71, 71, 71, 71, 71, 71, 71,
71, 71, 71, 71, 71, 71, 71, 71,
71, 71, 71, 71, 71, 71, 71, 71,
50, 50, 50, 50, 50, 50, 50, 50,
50, 50, 50, 50, 50, 50, 50, 50,
50, 50, 50, 50, 50, 50, 50, 50,
50, 50, 50, 50, 50, 50, 50, 50,
50, 50, 50, 50, 50, 50, 50, 50,
50, 50, 50, 50, 50, 50, 50, 50,
50, 50, 50, 50, 50, 50, 50, 50,
50, 50, 50, 50, 50, 50, 50, 50,
50, 50, 50, 50, 50, 50, 50, 50,
50, 50, 50, 50, 50, 50, 50, 50,
50, 50, 50, 50, 50, 50, 50, 50,
50, 50, 50, 50, 50, 50, 50, 50,
50, 50, 50, 50, 50, 50, 50, 50,
50, 50, 50, 50, 50, 50, 50, 50);
YY_EC_0022 : aliased constant YY_Secondary_Array :=
( 50, 50, 50, 50, 50, 50, 50, 50,
50, 50, 50, 50, 50, 50, 50, 50,
50, 50, 50, 50, 50, 50, 50, 50,
50, 50, 50, 50, 50, 50, 50, 50,
50, 50, 50, 50, 50, 50, 50, 50,
50, 50, 50, 50, 50, 50, 50, 50,
50, 50, 50, 50, 50, 50, 50, 50,
50, 50, 50, 50, 50, 50, 50, 50,
50, 50, 50, 50, 50, 50, 50, 50,
50, 50, 50, 50, 50, 50, 50, 50,
50, 50, 50, 50, 50, 50, 50, 50,
50, 50, 50, 50, 50, 50, 50, 50,
50, 50, 50, 50, 50, 50, 50, 50,
50, 50, 50, 50, 50, 50, 50, 50,
50, 50, 50, 50, 50, 50, 50, 50,
50, 50, 50, 50, 50, 50, 50, 50,
50, 50, 50, 50, 50, 50, 50, 50,
50, 50, 50, 50, 50, 50, 50, 50,
50, 50, 50, 50, 50, 50, 50, 50,
50, 50, 50, 50, 50, 50, 50, 50,
50, 50, 50, 50, 50, 50, 50, 50,
50, 50, 50, 50, 50, 50, 50, 50,
50, 50, 50, 50, 50, 50, 50, 50,
50, 50, 50, 50, 50, 50, 50, 50,
50, 50, 50, 50, 50, 50, 50, 50,
50, 50, 50, 50, 50, 50, 50, 50,
50, 50, 50, 50, 50, 50, 50, 50,
50, 50, 50, 50, 50, 50, 50, 50,
50, 50, 50, 50, 50, 50, 50, 50,
50, 50, 50, 50, 50, 50, 50, 50,
50, 50, 50, 50, 50, 50, 50, 50,
50, 50, 50, 50, 50, 50, 50, 50);
YY_EC_002F : aliased constant YY_Secondary_Array :=
( 71, 71, 71, 71, 71, 71, 71, 71,
71, 71, 71, 71, 71, 71, 71, 71,
71, 71, 71, 71, 71, 71, 71, 71,
71, 71, 71, 71, 71, 71, 71, 71,
71, 71, 71, 71, 71, 71, 71, 71,
71, 71, 71, 71, 71, 71, 71, 71,
71, 71, 71, 71, 71, 71, 71, 71,
71, 71, 71, 71, 71, 71, 71, 71,
71, 71, 71, 71, 71, 71, 71, 71,
71, 71, 71, 71, 71, 71, 71, 71,
71, 71, 71, 71, 71, 71, 71, 71,
71, 71, 71, 71, 71, 71, 71, 71,
71, 71, 71, 71, 71, 71, 71, 71,
71, 71, 71, 71, 71, 71, 71, 71,
71, 71, 71, 71, 71, 71, 71, 71,
71, 71, 71, 71, 71, 71, 71, 71,
71, 71, 71, 71, 71, 71, 71, 71,
71, 71, 71, 71, 71, 71, 71, 71,
71, 71, 71, 71, 71, 71, 71, 71,
71, 71, 71, 71, 71, 71, 71, 71,
71, 71, 71, 71, 71, 71, 71, 71,
71, 71, 71, 71, 71, 71, 71, 71,
71, 71, 71, 71, 71, 71, 71, 71,
71, 71, 71, 71, 71, 71, 71, 71,
71, 71, 71, 71, 71, 71, 71, 71,
71, 71, 71, 71, 71, 71, 71, 71,
71, 71, 71, 71, 71, 71, 71, 71,
71, 71, 71, 71, 71, 71, 71, 71,
71, 71, 71, 71, 71, 71, 71, 71,
71, 71, 71, 71, 71, 71, 71, 71,
50, 50, 50, 50, 50, 50, 50, 50,
50, 50, 50, 50, 50, 50, 50, 50);
YY_EC_0030 : aliased constant YY_Secondary_Array :=
( 50, 71, 71, 71, 71, 71, 71, 71,
71, 71, 71, 71, 71, 71, 71, 71,
71, 71, 71, 71, 71, 71, 71, 71,
71, 71, 71, 71, 71, 71, 71, 71,
71, 71, 71, 71, 71, 71, 71, 71,
71, 71, 71, 71, 71, 71, 71, 71,
71, 71, 71, 71, 71, 71, 71, 71,
71, 71, 71, 71, 71, 71, 71, 71,
71, 71, 71, 71, 71, 71, 71, 71,
71, 71, 71, 71, 71, 71, 71, 71,
71, 71, 71, 71, 71, 71, 71, 71,
71, 71, 71, 71, 71, 71, 71, 71,
71, 71, 71, 71, 71, 71, 71, 71,
71, 71, 71, 71, 71, 71, 71, 71,
71, 71, 71, 71, 71, 71, 71, 71,
71, 71, 71, 71, 71, 71, 71, 71,
71, 71, 71, 71, 71, 71, 71, 71,
71, 71, 71, 71, 71, 71, 71, 71,
71, 71, 71, 71, 71, 71, 71, 71,
71, 71, 71, 71, 71, 71, 71, 71,
71, 71, 71, 71, 71, 71, 71, 71,
71, 71, 71, 71, 71, 71, 71, 71,
71, 71, 71, 71, 71, 71, 71, 71,
71, 71, 71, 71, 71, 71, 71, 71,
71, 71, 71, 71, 71, 71, 71, 71,
71, 71, 71, 71, 71, 71, 71, 71,
71, 71, 71, 71, 71, 71, 71, 71,
71, 71, 71, 71, 71, 71, 71, 71,
71, 71, 71, 71, 71, 71, 71, 71,
71, 71, 71, 71, 71, 71, 71, 71,
71, 71, 71, 71, 71, 71, 71, 71,
71, 71, 71, 71, 71, 71, 71, 71);
YY_EC_00D8 : aliased constant YY_Secondary_Array :=
( 72, 72, 72, 72, 72, 72, 72, 72,
72, 72, 72, 72, 72, 72, 72, 72,
72, 72, 72, 72, 72, 72, 72, 72,
72, 72, 72, 72, 72, 72, 72, 72,
72, 72, 72, 72, 72, 72, 72, 72,
72, 72, 72, 72, 72, 72, 72, 72,
72, 72, 72, 72, 72, 72, 72, 72,
72, 72, 72, 72, 72, 72, 72, 72,
72, 72, 72, 72, 72, 72, 72, 72,
72, 72, 72, 72, 72, 72, 72, 72,
72, 72, 72, 72, 72, 72, 72, 72,
72, 72, 72, 72, 72, 72, 72, 72,
72, 72, 72, 72, 72, 72, 72, 72,
72, 72, 72, 72, 72, 72, 72, 72,
72, 72, 72, 72, 72, 72, 72, 72,
72, 72, 72, 72, 72, 72, 72, 72,
72, 72, 72, 72, 72, 72, 72, 72,
72, 72, 72, 72, 72, 72, 72, 72,
72, 72, 72, 72, 72, 72, 72, 72,
72, 72, 72, 72, 72, 72, 72, 72,
72, 72, 72, 72, 72, 72, 72, 72,
72, 72, 72, 72, 72, 72, 72, 72,
72, 72, 72, 72, 72, 72, 72, 72,
72, 72, 72, 72, 72, 72, 72, 72,
72, 72, 72, 72, 72, 72, 72, 72,
72, 72, 72, 72, 72, 72, 72, 72,
72, 72, 72, 72, 72, 72, 72, 72,
72, 72, 72, 72, 72, 72, 72, 72,
72, 72, 72, 72, 72, 72, 72, 72,
72, 72, 72, 72, 72, 72, 72, 72,
72, 72, 72, 72, 72, 72, 72, 72,
72, 72, 72, 72, 72, 72, 72, 72);
YY_EC_00FD : aliased constant YY_Secondary_Array :=
( 71, 71, 71, 71, 71, 71, 71, 71,
71, 71, 71, 71, 71, 71, 71, 71,
71, 71, 71, 71, 71, 71, 71, 71,
71, 71, 71, 71, 71, 71, 71, 71,
71, 71, 71, 71, 71, 71, 71, 71,
71, 71, 71, 71, 71, 71, 71, 71,
71, 71, 71, 71, 71, 71, 71, 71,
71, 71, 71, 71, 71, 71, 71, 71,
71, 71, 71, 71, 71, 71, 71, 71,
71, 71, 71, 71, 71, 71, 71, 71,
71, 71, 71, 71, 71, 71, 71, 71,
71, 71, 71, 71, 71, 71, 71, 71,
71, 71, 71, 71, 71, 71, 71, 71,
71, 71, 71, 71, 71, 71, 71, 71,
71, 71, 71, 71, 71, 71, 71, 71,
71, 71, 71, 71, 71, 71, 71, 71,
71, 71, 71, 71, 71, 71, 71, 71,
71, 71, 71, 71, 71, 71, 71, 71,
71, 71, 71, 71, 71, 71, 71, 71,
71, 71, 71, 71, 71, 71, 71, 71,
71, 71, 71, 71, 71, 71, 71, 71,
71, 71, 71, 71, 71, 71, 71, 71,
71, 71, 71, 71, 71, 71, 71, 71,
71, 71, 71, 71, 71, 71, 71, 71,
71, 71, 71, 71, 71, 71, 71, 71,
71, 71, 71, 71, 71, 71, 71, 71,
50, 50, 50, 50, 50, 50, 50, 50,
50, 50, 50, 50, 50, 50, 50, 50,
50, 50, 50, 50, 50, 50, 50, 50,
50, 50, 50, 50, 50, 50, 50, 50,
71, 71, 71, 71, 71, 71, 71, 71,
71, 71, 71, 71, 71, 71, 71, 71);
YY_EC_00FF : aliased constant YY_Secondary_Array :=
( 71, 71, 71, 71, 71, 71, 71, 71,
71, 71, 71, 71, 71, 71, 71, 71,
71, 71, 71, 71, 71, 71, 71, 71,
71, 71, 71, 71, 71, 71, 71, 71,
71, 71, 71, 71, 71, 71, 71, 71,
71, 71, 71, 71, 71, 71, 71, 71,
71, 71, 71, 71, 71, 71, 71, 71,
71, 71, 71, 71, 71, 71, 71, 71,
71, 71, 71, 71, 71, 71, 71, 71,
71, 71, 71, 71, 71, 71, 71, 71,
71, 71, 71, 71, 71, 71, 71, 71,
71, 71, 71, 71, 71, 71, 71, 71,
71, 71, 71, 71, 71, 71, 71, 71,
71, 71, 71, 71, 71, 71, 71, 71,
71, 71, 71, 71, 71, 71, 71, 71,
71, 71, 71, 71, 71, 71, 71, 71,
71, 71, 71, 71, 71, 71, 71, 71,
71, 71, 71, 71, 71, 71, 71, 71,
71, 71, 71, 71, 71, 71, 71, 71,
71, 71, 71, 71, 71, 71, 71, 71,
71, 71, 71, 71, 71, 71, 71, 71,
71, 71, 71, 71, 71, 71, 71, 71,
71, 71, 71, 71, 71, 71, 71, 71,
71, 71, 71, 71, 71, 71, 71, 71,
71, 71, 71, 71, 71, 71, 71, 71,
71, 71, 71, 71, 71, 71, 71, 71,
71, 71, 71, 71, 71, 71, 71, 71,
71, 71, 71, 71, 71, 71, 71, 71,
71, 71, 71, 71, 71, 71, 71, 71,
71, 71, 71, 71, 71, 71, 71, 71,
71, 71, 71, 71, 71, 71, 71, 71,
71, 71, 71, 71, 71, 71, 72, 72);
YY_EC_Base : constant
array (YY_Primary_Index) of YY_Secondary_Array_Access :=
(16#0000# => YY_EC_0000'Access, 16#0003# => YY_EC_0003'Access,
16#0020# => YY_EC_0020'Access, 16#0021# => YY_EC_0021'Access,
16#0022# => YY_EC_0022'Access, 16#0023# => YY_EC_0022'Access,
16#0024# => YY_EC_0022'Access, 16#0025# => YY_EC_0022'Access,
16#0026# => YY_EC_0022'Access, 16#0027# => YY_EC_0022'Access,
16#0028# => YY_EC_0022'Access, 16#0029# => YY_EC_0022'Access,
16#002A# => YY_EC_0022'Access, 16#002B# => YY_EC_0022'Access,
16#002F# => YY_EC_002F'Access, 16#0030# => YY_EC_0030'Access,
16#00D8# => YY_EC_00D8'Access, 16#00D9# => YY_EC_00D8'Access,
16#00DA# => YY_EC_00D8'Access, 16#00DB# => YY_EC_00D8'Access,
16#00DC# => YY_EC_00D8'Access, 16#00DD# => YY_EC_00D8'Access,
16#00DE# => YY_EC_00D8'Access, 16#00DF# => YY_EC_00D8'Access,
16#00E0# => YY_EC_0022'Access, 16#00E1# => YY_EC_0022'Access,
16#00E2# => YY_EC_0022'Access, 16#00E3# => YY_EC_0022'Access,
16#00E4# => YY_EC_0022'Access, 16#00E5# => YY_EC_0022'Access,
16#00E6# => YY_EC_0022'Access, 16#00E7# => YY_EC_0022'Access,
16#00E8# => YY_EC_0022'Access, 16#00E9# => YY_EC_0022'Access,
16#00EA# => YY_EC_0022'Access, 16#00EB# => YY_EC_0022'Access,
16#00EC# => YY_EC_0022'Access, 16#00ED# => YY_EC_0022'Access,
16#00EE# => YY_EC_0022'Access, 16#00EF# => YY_EC_0022'Access,
16#00F0# => YY_EC_0022'Access, 16#00F1# => YY_EC_0022'Access,
16#00F2# => YY_EC_0022'Access, 16#00F3# => YY_EC_0022'Access,
16#00F4# => YY_EC_0022'Access, 16#00F5# => YY_EC_0022'Access,
16#00F6# => YY_EC_0022'Access, 16#00F7# => YY_EC_0022'Access,
16#00F8# => YY_EC_0022'Access, 16#00FD# => YY_EC_00FD'Access,
16#00FF# => YY_EC_00FF'Access, 16#0F00# => YY_EC_0022'Access,
16#0F01# => YY_EC_0022'Access, 16#0F02# => YY_EC_0022'Access,
16#0F03# => YY_EC_0022'Access, 16#0F04# => YY_EC_0022'Access,
16#0F05# => YY_EC_0022'Access, 16#0F06# => YY_EC_0022'Access,
16#0F07# => YY_EC_0022'Access, 16#0F08# => YY_EC_0022'Access,
16#0F09# => YY_EC_0022'Access, 16#0F0A# => YY_EC_0022'Access,
16#0F0B# => YY_EC_0022'Access, 16#0F0C# => YY_EC_0022'Access,
16#0F0D# => YY_EC_0022'Access, 16#0F0E# => YY_EC_0022'Access,
16#0F0F# => YY_EC_0022'Access, 16#0F10# => YY_EC_0022'Access,
16#0F11# => YY_EC_0022'Access, 16#0F12# => YY_EC_0022'Access,
16#0F13# => YY_EC_0022'Access, 16#0F14# => YY_EC_0022'Access,
16#0F15# => YY_EC_0022'Access, 16#0F16# => YY_EC_0022'Access,
16#0F17# => YY_EC_0022'Access, 16#0F18# => YY_EC_0022'Access,
16#0F19# => YY_EC_0022'Access, 16#0F1A# => YY_EC_0022'Access,
16#0F1B# => YY_EC_0022'Access, 16#0F1C# => YY_EC_0022'Access,
16#0F1D# => YY_EC_0022'Access, 16#0F1E# => YY_EC_0022'Access,
16#0F1F# => YY_EC_0022'Access, 16#0F20# => YY_EC_0022'Access,
16#0F21# => YY_EC_0022'Access, 16#0F22# => YY_EC_0022'Access,
16#0F23# => YY_EC_0022'Access, 16#0F24# => YY_EC_0022'Access,
16#0F25# => YY_EC_0022'Access, 16#0F26# => YY_EC_0022'Access,
16#0F27# => YY_EC_0022'Access, 16#0F28# => YY_EC_0022'Access,
16#0F29# => YY_EC_0022'Access, 16#0F2A# => YY_EC_0022'Access,
16#0F2B# => YY_EC_0022'Access, 16#0F2C# => YY_EC_0022'Access,
16#0F2D# => YY_EC_0022'Access, 16#0F2E# => YY_EC_0022'Access,
16#0F2F# => YY_EC_0022'Access, 16#0F30# => YY_EC_0022'Access,
16#0F31# => YY_EC_0022'Access, 16#0F32# => YY_EC_0022'Access,
16#0F33# => YY_EC_0022'Access, 16#0F34# => YY_EC_0022'Access,
16#0F35# => YY_EC_0022'Access, 16#0F36# => YY_EC_0022'Access,
16#0F37# => YY_EC_0022'Access, 16#0F38# => YY_EC_0022'Access,
16#0F39# => YY_EC_0022'Access, 16#0F3A# => YY_EC_0022'Access,
16#0F3B# => YY_EC_0022'Access, 16#0F3C# => YY_EC_0022'Access,
16#0F3D# => YY_EC_0022'Access, 16#0F3E# => YY_EC_0022'Access,
16#0F3F# => YY_EC_0022'Access, 16#0F40# => YY_EC_0022'Access,
16#0F41# => YY_EC_0022'Access, 16#0F42# => YY_EC_0022'Access,
16#0F43# => YY_EC_0022'Access, 16#0F44# => YY_EC_0022'Access,
16#0F45# => YY_EC_0022'Access, 16#0F46# => YY_EC_0022'Access,
16#0F47# => YY_EC_0022'Access, 16#0F48# => YY_EC_0022'Access,
16#0F49# => YY_EC_0022'Access, 16#0F4A# => YY_EC_0022'Access,
16#0F4B# => YY_EC_0022'Access, 16#0F4C# => YY_EC_0022'Access,
16#0F4D# => YY_EC_0022'Access, 16#0F4E# => YY_EC_0022'Access,
16#0F4F# => YY_EC_0022'Access, 16#0F50# => YY_EC_0022'Access,
16#0F51# => YY_EC_0022'Access, 16#0F52# => YY_EC_0022'Access,
16#0F53# => YY_EC_0022'Access, 16#0F54# => YY_EC_0022'Access,
16#0F55# => YY_EC_0022'Access, 16#0F56# => YY_EC_0022'Access,
16#0F57# => YY_EC_0022'Access, 16#0F58# => YY_EC_0022'Access,
16#0F59# => YY_EC_0022'Access, 16#0F5A# => YY_EC_0022'Access,
16#0F5B# => YY_EC_0022'Access, 16#0F5C# => YY_EC_0022'Access,
16#0F5D# => YY_EC_0022'Access, 16#0F5E# => YY_EC_0022'Access,
16#0F5F# => YY_EC_0022'Access, 16#0F60# => YY_EC_0022'Access,
16#0F61# => YY_EC_0022'Access, 16#0F62# => YY_EC_0022'Access,
16#0F63# => YY_EC_0022'Access, 16#0F64# => YY_EC_0022'Access,
16#0F65# => YY_EC_0022'Access, 16#0F66# => YY_EC_0022'Access,
16#0F67# => YY_EC_0022'Access, 16#0F68# => YY_EC_0022'Access,
16#0F69# => YY_EC_0022'Access, 16#0F6A# => YY_EC_0022'Access,
16#0F6B# => YY_EC_0022'Access, 16#0F6C# => YY_EC_0022'Access,
16#0F6D# => YY_EC_0022'Access, 16#0F6E# => YY_EC_0022'Access,
16#0F6F# => YY_EC_0022'Access, 16#0F70# => YY_EC_0022'Access,
16#0F71# => YY_EC_0022'Access, 16#0F72# => YY_EC_0022'Access,
16#0F73# => YY_EC_0022'Access, 16#0F74# => YY_EC_0022'Access,
16#0F75# => YY_EC_0022'Access, 16#0F76# => YY_EC_0022'Access,
16#0F77# => YY_EC_0022'Access, 16#0F78# => YY_EC_0022'Access,
16#0F79# => YY_EC_0022'Access, 16#0F7A# => YY_EC_0022'Access,
16#0F7B# => YY_EC_0022'Access, 16#0F7C# => YY_EC_0022'Access,
16#0F7D# => YY_EC_0022'Access, 16#0F7E# => YY_EC_0022'Access,
16#0F7F# => YY_EC_0022'Access, 16#0F80# => YY_EC_0022'Access,
16#0F81# => YY_EC_0022'Access, 16#0F82# => YY_EC_0022'Access,
16#0F83# => YY_EC_0022'Access, 16#0F84# => YY_EC_0022'Access,
16#0F85# => YY_EC_0022'Access, 16#0F86# => YY_EC_0022'Access,
16#0F87# => YY_EC_0022'Access, 16#0F88# => YY_EC_0022'Access,
16#0F89# => YY_EC_0022'Access, 16#0F8A# => YY_EC_0022'Access,
16#0F8B# => YY_EC_0022'Access, 16#0F8C# => YY_EC_0022'Access,
16#0F8D# => YY_EC_0022'Access, 16#0F8E# => YY_EC_0022'Access,
16#0F8F# => YY_EC_0022'Access, 16#0F90# => YY_EC_0022'Access,
16#0F91# => YY_EC_0022'Access, 16#0F92# => YY_EC_0022'Access,
16#0F93# => YY_EC_0022'Access, 16#0F94# => YY_EC_0022'Access,
16#0F95# => YY_EC_0022'Access, 16#0F96# => YY_EC_0022'Access,
16#0F97# => YY_EC_0022'Access, 16#0F98# => YY_EC_0022'Access,
16#0F99# => YY_EC_0022'Access, 16#0F9A# => YY_EC_0022'Access,
16#0F9B# => YY_EC_0022'Access, 16#0F9C# => YY_EC_0022'Access,
16#0F9D# => YY_EC_0022'Access, 16#0F9E# => YY_EC_0022'Access,
16#0F9F# => YY_EC_0022'Access, 16#0FA0# => YY_EC_0022'Access,
16#0FA1# => YY_EC_0022'Access, 16#0FA2# => YY_EC_0022'Access,
16#0FA3# => YY_EC_0022'Access, 16#0FA4# => YY_EC_0022'Access,
16#0FA5# => YY_EC_0022'Access, 16#0FA6# => YY_EC_0022'Access,
16#0FA7# => YY_EC_0022'Access, 16#0FA8# => YY_EC_0022'Access,
16#0FA9# => YY_EC_0022'Access, 16#0FAA# => YY_EC_0022'Access,
16#0FAB# => YY_EC_0022'Access, 16#0FAC# => YY_EC_0022'Access,
16#0FAD# => YY_EC_0022'Access, 16#0FAE# => YY_EC_0022'Access,
16#0FAF# => YY_EC_0022'Access, 16#0FB0# => YY_EC_0022'Access,
16#0FB1# => YY_EC_0022'Access, 16#0FB2# => YY_EC_0022'Access,
16#0FB3# => YY_EC_0022'Access, 16#0FB4# => YY_EC_0022'Access,
16#0FB5# => YY_EC_0022'Access, 16#0FB6# => YY_EC_0022'Access,
16#0FB7# => YY_EC_0022'Access, 16#0FB8# => YY_EC_0022'Access,
16#0FB9# => YY_EC_0022'Access, 16#0FBA# => YY_EC_0022'Access,
16#0FBB# => YY_EC_0022'Access, 16#0FBC# => YY_EC_0022'Access,
16#0FBD# => YY_EC_0022'Access, 16#0FBE# => YY_EC_0022'Access,
16#0FBF# => YY_EC_0022'Access, 16#0FC0# => YY_EC_0022'Access,
16#0FC1# => YY_EC_0022'Access, 16#0FC2# => YY_EC_0022'Access,
16#0FC3# => YY_EC_0022'Access, 16#0FC4# => YY_EC_0022'Access,
16#0FC5# => YY_EC_0022'Access, 16#0FC6# => YY_EC_0022'Access,
16#0FC7# => YY_EC_0022'Access, 16#0FC8# => YY_EC_0022'Access,
16#0FC9# => YY_EC_0022'Access, 16#0FCA# => YY_EC_0022'Access,
16#0FCB# => YY_EC_0022'Access, 16#0FCC# => YY_EC_0022'Access,
16#0FCD# => YY_EC_0022'Access, 16#0FCE# => YY_EC_0022'Access,
16#0FCF# => YY_EC_0022'Access, 16#0FD0# => YY_EC_0022'Access,
16#0FD1# => YY_EC_0022'Access, 16#0FD2# => YY_EC_0022'Access,
16#0FD3# => YY_EC_0022'Access, 16#0FD4# => YY_EC_0022'Access,
16#0FD5# => YY_EC_0022'Access, 16#0FD6# => YY_EC_0022'Access,
16#0FD7# => YY_EC_0022'Access, 16#0FD8# => YY_EC_0022'Access,
16#0FD9# => YY_EC_0022'Access, 16#0FDA# => YY_EC_0022'Access,
16#0FDB# => YY_EC_0022'Access, 16#0FDC# => YY_EC_0022'Access,
16#0FDD# => YY_EC_0022'Access, 16#0FDE# => YY_EC_0022'Access,
16#0FDF# => YY_EC_0022'Access, 16#0FE0# => YY_EC_0022'Access,
16#0FE1# => YY_EC_0022'Access, 16#0FE2# => YY_EC_0022'Access,
16#0FE3# => YY_EC_0022'Access, 16#0FE4# => YY_EC_0022'Access,
16#0FE5# => YY_EC_0022'Access, 16#0FE6# => YY_EC_0022'Access,
16#0FE7# => YY_EC_0022'Access, 16#0FE8# => YY_EC_0022'Access,
16#0FE9# => YY_EC_0022'Access, 16#0FEA# => YY_EC_0022'Access,
16#0FEB# => YY_EC_0022'Access, 16#0FEC# => YY_EC_0022'Access,
16#0FED# => YY_EC_0022'Access, 16#0FEE# => YY_EC_0022'Access,
16#0FEF# => YY_EC_0022'Access, 16#0FF0# => YY_EC_0022'Access,
16#0FF1# => YY_EC_0022'Access, 16#0FF2# => YY_EC_0022'Access,
16#0FF3# => YY_EC_0022'Access, 16#0FF4# => YY_EC_0022'Access,
16#0FF5# => YY_EC_0022'Access, 16#0FF6# => YY_EC_0022'Access,
16#0FF7# => YY_EC_0022'Access, 16#0FF8# => YY_EC_0022'Access,
16#0FF9# => YY_EC_0022'Access, 16#0FFA# => YY_EC_0022'Access,
16#0FFB# => YY_EC_0022'Access, 16#0FFC# => YY_EC_0022'Access,
16#0FFD# => YY_EC_0022'Access, 16#0FFE# => YY_EC_0022'Access,
16#0FFF# => YY_EC_0022'Access, 16#1000# => YY_EC_0022'Access,
16#1001# => YY_EC_0022'Access, 16#1002# => YY_EC_0022'Access,
16#1003# => YY_EC_0022'Access, 16#1004# => YY_EC_0022'Access,
16#1005# => YY_EC_0022'Access, 16#1006# => YY_EC_0022'Access,
16#1007# => YY_EC_0022'Access, 16#1008# => YY_EC_0022'Access,
16#1009# => YY_EC_0022'Access, 16#100A# => YY_EC_0022'Access,
16#100B# => YY_EC_0022'Access, 16#100C# => YY_EC_0022'Access,
16#100D# => YY_EC_0022'Access, 16#100E# => YY_EC_0022'Access,
16#100F# => YY_EC_0022'Access, 16#1010# => YY_EC_0022'Access,
16#1011# => YY_EC_0022'Access, 16#1012# => YY_EC_0022'Access,
16#1013# => YY_EC_0022'Access, 16#1014# => YY_EC_0022'Access,
16#1015# => YY_EC_0022'Access, 16#1016# => YY_EC_0022'Access,
16#1017# => YY_EC_0022'Access, 16#1018# => YY_EC_0022'Access,
16#1019# => YY_EC_0022'Access, 16#101A# => YY_EC_0022'Access,
16#101B# => YY_EC_0022'Access, 16#101C# => YY_EC_0022'Access,
16#101D# => YY_EC_0022'Access, 16#101E# => YY_EC_0022'Access,
16#101F# => YY_EC_0022'Access, 16#1020# => YY_EC_0022'Access,
16#1021# => YY_EC_0022'Access, 16#1022# => YY_EC_0022'Access,
16#1023# => YY_EC_0022'Access, 16#1024# => YY_EC_0022'Access,
16#1025# => YY_EC_0022'Access, 16#1026# => YY_EC_0022'Access,
16#1027# => YY_EC_0022'Access, 16#1028# => YY_EC_0022'Access,
16#1029# => YY_EC_0022'Access, 16#102A# => YY_EC_0022'Access,
16#102B# => YY_EC_0022'Access, 16#102C# => YY_EC_0022'Access,
16#102D# => YY_EC_0022'Access, 16#102E# => YY_EC_0022'Access,
16#102F# => YY_EC_0022'Access, 16#1030# => YY_EC_0022'Access,
16#1031# => YY_EC_0022'Access, 16#1032# => YY_EC_0022'Access,
16#1033# => YY_EC_0022'Access, 16#1034# => YY_EC_0022'Access,
16#1035# => YY_EC_0022'Access, 16#1036# => YY_EC_0022'Access,
16#1037# => YY_EC_0022'Access, 16#1038# => YY_EC_0022'Access,
16#1039# => YY_EC_0022'Access, 16#103A# => YY_EC_0022'Access,
16#103B# => YY_EC_0022'Access, 16#103C# => YY_EC_0022'Access,
16#103D# => YY_EC_0022'Access, 16#103E# => YY_EC_0022'Access,
16#103F# => YY_EC_0022'Access, 16#1040# => YY_EC_0022'Access,
16#1041# => YY_EC_0022'Access, 16#1042# => YY_EC_0022'Access,
16#1043# => YY_EC_0022'Access, 16#1044# => YY_EC_0022'Access,
16#1045# => YY_EC_0022'Access, 16#1046# => YY_EC_0022'Access,
16#1047# => YY_EC_0022'Access, 16#1048# => YY_EC_0022'Access,
16#1049# => YY_EC_0022'Access, 16#104A# => YY_EC_0022'Access,
16#104B# => YY_EC_0022'Access, 16#104C# => YY_EC_0022'Access,
16#104D# => YY_EC_0022'Access, 16#104E# => YY_EC_0022'Access,
16#104F# => YY_EC_0022'Access, 16#1050# => YY_EC_0022'Access,
16#1051# => YY_EC_0022'Access, 16#1052# => YY_EC_0022'Access,
16#1053# => YY_EC_0022'Access, 16#1054# => YY_EC_0022'Access,
16#1055# => YY_EC_0022'Access, 16#1056# => YY_EC_0022'Access,
16#1057# => YY_EC_0022'Access, 16#1058# => YY_EC_0022'Access,
16#1059# => YY_EC_0022'Access, 16#105A# => YY_EC_0022'Access,
16#105B# => YY_EC_0022'Access, 16#105C# => YY_EC_0022'Access,
16#105D# => YY_EC_0022'Access, 16#105E# => YY_EC_0022'Access,
16#105F# => YY_EC_0022'Access, 16#1060# => YY_EC_0022'Access,
16#1061# => YY_EC_0022'Access, 16#1062# => YY_EC_0022'Access,
16#1063# => YY_EC_0022'Access, 16#1064# => YY_EC_0022'Access,
16#1065# => YY_EC_0022'Access, 16#1066# => YY_EC_0022'Access,
16#1067# => YY_EC_0022'Access, 16#1068# => YY_EC_0022'Access,
16#1069# => YY_EC_0022'Access, 16#106A# => YY_EC_0022'Access,
16#106B# => YY_EC_0022'Access, 16#106C# => YY_EC_0022'Access,
16#106D# => YY_EC_0022'Access, 16#106E# => YY_EC_0022'Access,
16#106F# => YY_EC_0022'Access, 16#1070# => YY_EC_0022'Access,
16#1071# => YY_EC_0022'Access, 16#1072# => YY_EC_0022'Access,
16#1073# => YY_EC_0022'Access, 16#1074# => YY_EC_0022'Access,
16#1075# => YY_EC_0022'Access, 16#1076# => YY_EC_0022'Access,
16#1077# => YY_EC_0022'Access, 16#1078# => YY_EC_0022'Access,
16#1079# => YY_EC_0022'Access, 16#107A# => YY_EC_0022'Access,
16#107B# => YY_EC_0022'Access, 16#107C# => YY_EC_0022'Access,
16#107D# => YY_EC_0022'Access, 16#107E# => YY_EC_0022'Access,
16#107F# => YY_EC_0022'Access, 16#1080# => YY_EC_0022'Access,
16#1081# => YY_EC_0022'Access, 16#1082# => YY_EC_0022'Access,
16#1083# => YY_EC_0022'Access, 16#1084# => YY_EC_0022'Access,
16#1085# => YY_EC_0022'Access, 16#1086# => YY_EC_0022'Access,
16#1087# => YY_EC_0022'Access, 16#1088# => YY_EC_0022'Access,
16#1089# => YY_EC_0022'Access, 16#108A# => YY_EC_0022'Access,
16#108B# => YY_EC_0022'Access, 16#108C# => YY_EC_0022'Access,
16#108D# => YY_EC_0022'Access, 16#108E# => YY_EC_0022'Access,
16#108F# => YY_EC_0022'Access, 16#1090# => YY_EC_0022'Access,
16#1091# => YY_EC_0022'Access, 16#1092# => YY_EC_0022'Access,
16#1093# => YY_EC_0022'Access, 16#1094# => YY_EC_0022'Access,
16#1095# => YY_EC_0022'Access, 16#1096# => YY_EC_0022'Access,
16#1097# => YY_EC_0022'Access, 16#1098# => YY_EC_0022'Access,
16#1099# => YY_EC_0022'Access, 16#109A# => YY_EC_0022'Access,
16#109B# => YY_EC_0022'Access, 16#109C# => YY_EC_0022'Access,
16#109D# => YY_EC_0022'Access, 16#109E# => YY_EC_0022'Access,
16#109F# => YY_EC_0022'Access, 16#10A0# => YY_EC_0022'Access,
16#10A1# => YY_EC_0022'Access, 16#10A2# => YY_EC_0022'Access,
16#10A3# => YY_EC_0022'Access, 16#10A4# => YY_EC_0022'Access,
16#10A5# => YY_EC_0022'Access, 16#10A6# => YY_EC_0022'Access,
16#10A7# => YY_EC_0022'Access, 16#10A8# => YY_EC_0022'Access,
16#10A9# => YY_EC_0022'Access, 16#10AA# => YY_EC_0022'Access,
16#10AB# => YY_EC_0022'Access, 16#10AC# => YY_EC_0022'Access,
16#10AD# => YY_EC_0022'Access, 16#10AE# => YY_EC_0022'Access,
16#10AF# => YY_EC_0022'Access, 16#10B0# => YY_EC_0022'Access,
16#10B1# => YY_EC_0022'Access, 16#10B2# => YY_EC_0022'Access,
16#10B3# => YY_EC_0022'Access, 16#10B4# => YY_EC_0022'Access,
16#10B5# => YY_EC_0022'Access, 16#10B6# => YY_EC_0022'Access,
16#10B7# => YY_EC_0022'Access, 16#10B8# => YY_EC_0022'Access,
16#10B9# => YY_EC_0022'Access, 16#10BA# => YY_EC_0022'Access,
16#10BB# => YY_EC_0022'Access, 16#10BC# => YY_EC_0022'Access,
16#10BD# => YY_EC_0022'Access, 16#10BE# => YY_EC_0022'Access,
16#10BF# => YY_EC_0022'Access, 16#10C0# => YY_EC_0022'Access,
16#10C1# => YY_EC_0022'Access, 16#10C2# => YY_EC_0022'Access,
16#10C3# => YY_EC_0022'Access, 16#10C4# => YY_EC_0022'Access,
16#10C5# => YY_EC_0022'Access, 16#10C6# => YY_EC_0022'Access,
16#10C7# => YY_EC_0022'Access, 16#10C8# => YY_EC_0022'Access,
16#10C9# => YY_EC_0022'Access, 16#10CA# => YY_EC_0022'Access,
16#10CB# => YY_EC_0022'Access, 16#10CC# => YY_EC_0022'Access,
16#10CD# => YY_EC_0022'Access, 16#10CE# => YY_EC_0022'Access,
16#10CF# => YY_EC_0022'Access, 16#10D0# => YY_EC_0022'Access,
16#10D1# => YY_EC_0022'Access, 16#10D2# => YY_EC_0022'Access,
16#10D3# => YY_EC_0022'Access, 16#10D4# => YY_EC_0022'Access,
16#10D5# => YY_EC_0022'Access, 16#10D6# => YY_EC_0022'Access,
16#10D7# => YY_EC_0022'Access, 16#10D8# => YY_EC_0022'Access,
16#10D9# => YY_EC_0022'Access, 16#10DA# => YY_EC_0022'Access,
16#10DB# => YY_EC_0022'Access, 16#10DC# => YY_EC_0022'Access,
16#10DD# => YY_EC_0022'Access, 16#10DE# => YY_EC_0022'Access,
16#10DF# => YY_EC_0022'Access, 16#10E0# => YY_EC_0022'Access,
16#10E1# => YY_EC_0022'Access, 16#10E2# => YY_EC_0022'Access,
16#10E3# => YY_EC_0022'Access, 16#10E4# => YY_EC_0022'Access,
16#10E5# => YY_EC_0022'Access, 16#10E6# => YY_EC_0022'Access,
16#10E7# => YY_EC_0022'Access, 16#10E8# => YY_EC_0022'Access,
16#10E9# => YY_EC_0022'Access, 16#10EA# => YY_EC_0022'Access,
16#10EB# => YY_EC_0022'Access, 16#10EC# => YY_EC_0022'Access,
16#10ED# => YY_EC_0022'Access, 16#10EE# => YY_EC_0022'Access,
16#10EF# => YY_EC_0022'Access, 16#10F0# => YY_EC_0022'Access,
16#10F1# => YY_EC_0022'Access, 16#10F2# => YY_EC_0022'Access,
16#10F3# => YY_EC_0022'Access, 16#10F4# => YY_EC_0022'Access,
16#10F5# => YY_EC_0022'Access, 16#10F6# => YY_EC_0022'Access,
16#10F7# => YY_EC_0022'Access, 16#10F8# => YY_EC_0022'Access,
16#10F9# => YY_EC_0022'Access, 16#10FA# => YY_EC_0022'Access,
16#10FB# => YY_EC_0022'Access, 16#10FC# => YY_EC_0022'Access,
16#10FD# => YY_EC_0022'Access, 16#10FE# => YY_EC_0022'Access,
16#10FF# => YY_EC_0022'Access, others => YY_EC_0001'Access);
end XML.SAX.Simple_Readers.Scanner.Tables;
|
nerilex/ada-util | Ada | 1,404 | adb | -----------------------------------------------------------------------
-- Util.Concurrent.Copies -- Concurrent Tools
-- Copyright (C) 2011 Stephane Carrez
-- Written by Stephane Carrez ([email protected])
--
-- Licensed under the Apache License, Version 2.0 (the "License");
-- you may not use this file except in compliance with the License.
-- You may obtain a copy of the License at
--
-- http://www.apache.org/licenses/LICENSE-2.0
--
-- Unless required by applicable law or agreed to in writing, software
-- distributed under the License is distributed on an "AS IS" BASIS,
-- WITHOUT WARRANTIES OR CONDITIONS OF ANY KIND, either express or implied.
-- See the License for the specific language governing permissions and
-- limitations under the License.
-----------------------------------------------------------------------
package body Util.Concurrent.Copies is
protected body Atomic is
-- ------------------------------
-- Get the value atomically
-- ------------------------------
function Get return Element_Type is
begin
return Value;
end Get;
-- ------------------------------
-- Change the value atomically.
-- ------------------------------
procedure Set (Object : in Element_Type) is
begin
Value := Object;
end Set;
end Atomic;
end Util.Concurrent.Copies;
|
yannickmoy/SPARKNaCl | Ada | 6,094 | adb | package body SPARKNaCl.Stream
with SPARK_Mode => On
is
pragma Warnings (GNATProve, Off, "pragma * ignored (not yet supported)");
--------------------------------------------------------
-- Local subprogram declarations
--------------------------------------------------------
procedure Salsa20_Xor_Local
(C : out Byte_Seq;
M : in Byte_Seq;
Xor_M : in Boolean; -- If True then xor M against Stream
-- If False then return Stream unmodified
N : in Salsa20_Nonce; -- Nonce
K : in Salsa20_Key) -- Key
with Global => null,
Pre => M'First = 0 and then
C'First = 0 and then
(if Xor_M then (C'Last = M'Last)) and then
(if not Xor_M then M'Last = 0);
--------------------------------------------------------
-- Local subprogram bodies
--------------------------------------------------------
procedure Salsa20_Xor_Local
(C : out Byte_Seq;
M : in Byte_Seq;
Xor_M : in Boolean; -- If True then xor M against Stream
-- If False then return Stream unmodified
N : in Salsa20_Nonce; -- Nonce
K : in Salsa20_Key) -- Key
is
Full_Block_Count : constant I32 := C'Last / 64;
subtype Offset_Range is I32 range 0 .. (Full_Block_Count * 64);
subtype Natural_64 is I64 range 0 .. I64'Last;
Offset : Offset_Range;
Final_Offset : I32;
Z : Bytes_16;
X : Bytes_64;
U : U32;
B : Natural_64;
begin
B := C'Length;
C := (others => 0);
if B = 0 then
return;
end if;
Offset := 0;
Z := (others => 0);
Z (0 .. 7) := Bytes_8 (N);
if B >= 64 then
loop
pragma Loop_Optimize (No_Unroll);
pragma Loop_Invariant
((B + I64 (Offset) = C'Length) and then
(I64 (Offset) <= (C'Length - B)) and then
((C'Length - B) <= I64 (C'Last) - 63));
Core.Salsa20 (X, Z, K, Sigma);
for I in Index_64 loop
pragma Loop_Optimize (No_Unroll);
pragma Loop_Invariant
((Offset + I) in C'Range and
(if Xor_M then (Offset + I) in M'Range));
C (Offset + I) :=
(if Xor_M then M (Offset + I) else 0) xor
X (I);
end loop;
U := 1;
for I in I32 range 8 .. 15 loop
pragma Loop_Optimize (No_Unroll);
U := U + U32 (Z (I));
Z (I) := Byte (U mod 256);
U := Shift_Right (U, 8);
end loop;
B := B - 64;
-- Exit here to prevent subsequent overflow of Offset + 64
-- on the final iteration
exit when B < 64;
Offset := Offset + 64;
end loop;
if B > 0 then
-- Final block is non-empty but incomplete. It starts
-- at Offset C'Length - B
Final_Offset := I32 (C'Length - B);
else
-- B = 0 so final block is empty, so nothing more to do.
-- Set Final_Offset here to avoid a data-flow error.
Final_Offset := 0;
end if;
else
-- Only a single, incomplete block to process, so it must
-- start at Offset 0
Final_Offset := 0;
end if;
if B > 0 then
Core.Salsa20 (X, Z, K, Sigma);
for I in I32 range 0 .. I32 (B - 1) loop
pragma Loop_Optimize (No_Unroll);
pragma Loop_Invariant
((Final_Offset + I) in C'Range and
(if Xor_M then (Final_Offset + I) in M'Range));
C (Final_Offset + I) :=
(if Xor_M then
M (Final_Offset + I) else 0) xor
X (I);
end loop;
end if;
pragma Warnings (GNATProve, Off, "statement has no effect");
Sanitize (X);
Sanitize (Z);
pragma Unreferenced (X, Z);
end Salsa20_Xor_Local;
--------------------------------------------------------
-- Exported subprogram bodies
--------------------------------------------------------
procedure Salsa20 (C : out Byte_Seq; -- Output stream
N : in Salsa20_Nonce; -- Nonce
K : in Salsa20_Key) -- Key
is
Null_M : Byte_Seq (0 .. 0);
begin
Null_M := (others => 0);
Salsa20_Xor_Local (C, Null_M, False, N, K);
end Salsa20;
procedure Salsa20_Xor (C : out Byte_Seq; -- Output stream
M : in Byte_Seq; -- Input message
N : in Salsa20_Nonce; -- Nonce
K : in Salsa20_Key) -- Key
is
begin
Salsa20_Xor_Local (C, M, True, N, K);
end Salsa20_Xor;
procedure HSalsa20 (C : out Byte_Seq; -- Output stream
N : in HSalsa20_Nonce; -- Nonce
K : in Salsa20_Key) -- Key
is
S : Bytes_32;
begin
Core.HSalsa20 (S, Bytes_16 (N (0 .. 15)), K, Sigma);
Salsa20 (C, Salsa20_Nonce (N (16 .. 23)), Core.Construct (S));
Sanitize (S);
pragma Unreferenced (S);
end HSalsa20;
procedure HSalsa20_Xor (C : out Byte_Seq; -- Output ciphertext
M : in Byte_Seq; -- Input message
N : in HSalsa20_Nonce; -- Nonce
K : in Salsa20_Key) -- Key
is
S : Bytes_32;
begin
Core.HSalsa20 (S, Bytes_16 (N (0 .. 15)), K, Sigma);
Salsa20_Xor_Local (C => C,
M => M,
Xor_M => True,
N => Salsa20_Nonce (N (16 .. 23)),
K => Core.Construct (S));
Sanitize (S);
pragma Unreferenced (S);
end HSalsa20_Xor;
end SPARKNaCl.Stream;
|
reznikmm/slimp | Ada | 1,450 | adb | -- Copyright (c) 2019 Maxim Reznik <[email protected]>
--
-- SPDX-License-Identifier: MIT
-- License-Filename: LICENSE
-------------------------------------------------------------
with Slim.Message_Visiters;
package body Slim.Messages.HELO is
List : constant Field_Description_Array :=
((Uint_8_Field, 1), -- Device kind
(Uint_8_Field, 1), -- Firmware Revision
(Uint_8_Field, 6), -- MAC address
(Uint_8_Field, 16), -- UID
(Uint_16_Field, 1), -- WLAN
(Uint_64_Field, 1), -- Received
(Uint_8_Field, 2)); -- Lang
----------
-- Read --
----------
overriding function Read
(Data : not null access
League.Stream_Element_Vectors.Stream_Element_Vector)
return HELO_Message is
begin
return Result : HELO_Message do
Read_Fields (Result, List, Data.all);
end return;
end Read;
-----------
-- Visit --
-----------
overriding procedure Visit
(Self : not null access HELO_Message;
Visiter : in out Slim.Message_Visiters.Visiter'Class) is
begin
Visiter.HELO (Self);
end Visit;
-----------
-- Write --
-----------
overriding procedure Write
(Self : HELO_Message;
Tag : out Message_Tag;
Data : out League.Stream_Element_Vectors.Stream_Element_Vector) is
begin
Tag := "HELO";
Write_Fields (Self, List, Data);
end Write;
end Slim.Messages.HELO;
|
reznikmm/matreshka | Ada | 3,754 | 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.Form_Xforms_List_Source_Attributes is
pragma Preelaborate;
type ODF_Form_Xforms_List_Source_Attribute is limited interface
and XML.DOM.Attributes.DOM_Attribute;
type ODF_Form_Xforms_List_Source_Attribute_Access is
access all ODF_Form_Xforms_List_Source_Attribute'Class
with Storage_Size => 0;
end ODF.DOM.Form_Xforms_List_Source_Attributes;
|
stcarrez/ada-awa | Ada | 22,233 | ads | -----------------------------------------------------------------------
-- AWA.Settings.Models -- AWA.Settings.Models
-----------------------------------------------------------------------
-- File generated by Dynamo DO NOT MODIFY
-- Template used: templates/model/package-spec.xhtml
-- Ada Generator: https://github.com/stcarrez/dynamo Version 1.4.0
-----------------------------------------------------------------------
-- Copyright (C) 2023 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.
-----------------------------------------------------------------------
pragma Warnings (Off);
with ADO.Sessions;
with ADO.Objects;
with ADO.Statements;
with ADO.SQL;
with ADO.Schemas;
with Ada.Containers.Vectors;
with Ada.Strings.Unbounded;
with Util.Beans.Objects;
with Util.Beans.Basic.Lists;
with AWA.Users.Models;
pragma Warnings (On);
package AWA.Settings.Models is
pragma Style_Checks ("-mrIu");
type Setting_Ref is new ADO.Objects.Object_Ref with null record;
type Global_Setting_Ref is new ADO.Objects.Object_Ref with null record;
type User_Setting_Ref is new ADO.Objects.Object_Ref with null record;
-- --------------------
-- The setting table defines all the possible settings
-- that an application manages. This table is automatically
-- populated when an application starts. It is not modified.
-- --------------------
-- Create an object key for Setting.
function Setting_Key (Id : in ADO.Identifier) return ADO.Objects.Object_Key;
-- Create an object key for Setting from a string.
-- Raises Constraint_Error if the string cannot be converted into the object key.
function Setting_Key (Id : in String) return ADO.Objects.Object_Key;
Null_Setting : constant Setting_Ref;
function "=" (Left, Right : Setting_Ref'Class) return Boolean;
-- Set the setting identifier.
procedure Set_Id (Object : in out Setting_Ref;
Value : in ADO.Identifier);
-- Get the setting identifier.
function Get_Id (Object : in Setting_Ref)
return ADO.Identifier;
-- Set the setting name.
procedure Set_Name (Object : in out Setting_Ref;
Value : in Ada.Strings.Unbounded.Unbounded_String);
procedure Set_Name (Object : in out Setting_Ref;
Value : in String);
-- Get the setting name.
function Get_Name (Object : in Setting_Ref)
return Ada.Strings.Unbounded.Unbounded_String;
function Get_Name (Object : in Setting_Ref)
return String;
-- Load the entity identified by 'Id'.
-- Raises the NOT_FOUND exception if it does not exist.
procedure Load (Object : in out Setting_Ref;
Session : in out ADO.Sessions.Session'Class;
Id : in ADO.Identifier);
-- Load the entity identified by 'Id'.
-- Returns True in <b>Found</b> if the object was found and False if it does not exist.
procedure Load (Object : in out Setting_Ref;
Session : in out ADO.Sessions.Session'Class;
Id : in ADO.Identifier;
Found : out Boolean);
-- Find and load the entity.
overriding
procedure Find (Object : in out Setting_Ref;
Session : in out ADO.Sessions.Session'Class;
Query : in ADO.SQL.Query'Class;
Found : out Boolean);
-- Save the entity. If the entity does not have an identifier, an identifier is allocated
-- and it is inserted in the table. Otherwise, only data fields which have been changed
-- are updated.
overriding
procedure Save (Object : in out Setting_Ref;
Session : in out ADO.Sessions.Master_Session'Class);
-- Delete the entity.
overriding
procedure Delete (Object : in out Setting_Ref;
Session : in out ADO.Sessions.Master_Session'Class);
overriding
function Get_Value (From : in Setting_Ref;
Name : in String) return Util.Beans.Objects.Object;
-- Table definition
SETTING_TABLE : constant ADO.Schemas.Class_Mapping_Access;
-- Internal method to allocate the Object_Record instance
overriding
procedure Allocate (Object : in out Setting_Ref);
-- Copy of the object.
procedure Copy (Object : in Setting_Ref;
Into : in out Setting_Ref);
package Setting_Vectors is
new Ada.Containers.Vectors (Index_Type => Positive,
Element_Type => Setting_Ref,
"=" => "=");
subtype Setting_Vector is Setting_Vectors.Vector;
procedure List (Object : in out Setting_Vector;
Session : in out ADO.Sessions.Session'Class;
Query : in ADO.SQL.Query'Class);
-- --------------------
-- The global setting holds some generic
-- application configuration parameter
-- which can be stored in the database.
-- The global setting can be specific to a server.
-- --------------------
-- Create an object key for Global_Setting.
function Global_Setting_Key (Id : in ADO.Identifier) return ADO.Objects.Object_Key;
-- Create an object key for Global_Setting from a string.
-- Raises Constraint_Error if the string cannot be converted into the object key.
function Global_Setting_Key (Id : in String) return ADO.Objects.Object_Key;
Null_Global_Setting : constant Global_Setting_Ref;
function "=" (Left, Right : Global_Setting_Ref'Class) return Boolean;
-- Set the global setting identifier.
procedure Set_Id (Object : in out Global_Setting_Ref;
Value : in ADO.Identifier);
-- Get the global setting identifier.
function Get_Id (Object : in Global_Setting_Ref)
return ADO.Identifier;
-- Set the global setting value.
procedure Set_Value (Object : in out Global_Setting_Ref;
Value : in Ada.Strings.Unbounded.Unbounded_String);
procedure Set_Value (Object : in out Global_Setting_Ref;
Value : in String);
-- Get the global setting value.
function Get_Value (Object : in Global_Setting_Ref)
return Ada.Strings.Unbounded.Unbounded_String;
function Get_Value (Object : in Global_Setting_Ref)
return String;
-- Get the global setting optimistic lock version.
function Get_Version (Object : in Global_Setting_Ref)
return Integer;
-- Set the server to which this global setting applies.
procedure Set_Server_Id (Object : in out Global_Setting_Ref;
Value : in Integer);
-- Get the server to which this global setting applies.
function Get_Server_Id (Object : in Global_Setting_Ref)
return Integer;
-- Set the setting that corresponds to this global setting.
procedure Set_Setting (Object : in out Global_Setting_Ref;
Value : in Setting_Ref'Class);
-- Get the setting that corresponds to this global setting.
function Get_Setting (Object : in Global_Setting_Ref)
return Setting_Ref'Class;
-- Load the entity identified by 'Id'.
-- Raises the NOT_FOUND exception if it does not exist.
procedure Load (Object : in out Global_Setting_Ref;
Session : in out ADO.Sessions.Session'Class;
Id : in ADO.Identifier);
-- Load the entity identified by 'Id'.
-- Returns True in <b>Found</b> if the object was found and False if it does not exist.
procedure Load (Object : in out Global_Setting_Ref;
Session : in out ADO.Sessions.Session'Class;
Id : in ADO.Identifier;
Found : out Boolean);
-- Reload from the database the same object if it was modified.
-- Returns True in `Updated` if the object was reloaded.
-- Raises the NOT_FOUND exception if it does not exist.
procedure Reload (Object : in out Global_Setting_Ref;
Session : in out ADO.Sessions.Session'Class;
Updated : out Boolean);
-- Find and load the entity.
overriding
procedure Find (Object : in out Global_Setting_Ref;
Session : in out ADO.Sessions.Session'Class;
Query : in ADO.SQL.Query'Class;
Found : out Boolean);
-- Save the entity. If the entity does not have an identifier, an identifier is allocated
-- and it is inserted in the table. Otherwise, only data fields which have been changed
-- are updated.
overriding
procedure Save (Object : in out Global_Setting_Ref;
Session : in out ADO.Sessions.Master_Session'Class);
-- Delete the entity.
overriding
procedure Delete (Object : in out Global_Setting_Ref;
Session : in out ADO.Sessions.Master_Session'Class);
overriding
function Get_Value (From : in Global_Setting_Ref;
Name : in String) return Util.Beans.Objects.Object;
-- Table definition
GLOBAL_SETTING_TABLE : constant ADO.Schemas.Class_Mapping_Access;
-- Internal method to allocate the Object_Record instance
overriding
procedure Allocate (Object : in out Global_Setting_Ref);
-- Copy of the object.
procedure Copy (Object : in Global_Setting_Ref;
Into : in out Global_Setting_Ref);
package Global_Setting_Vectors is
new Ada.Containers.Vectors (Index_Type => Positive,
Element_Type => Global_Setting_Ref,
"=" => "=");
subtype Global_Setting_Vector is Global_Setting_Vectors.Vector;
procedure List (Object : in out Global_Setting_Vector;
Session : in out ADO.Sessions.Session'Class;
Query : in ADO.SQL.Query'Class);
-- --------------------
-- The user setting holds the setting value for a given user.
-- It is created the first time a user changes the default
-- setting value. It is updated when the user modifies the setting.
-- --------------------
-- Create an object key for User_Setting.
function User_Setting_Key (Id : in ADO.Identifier) return ADO.Objects.Object_Key;
-- Create an object key for User_Setting from a string.
-- Raises Constraint_Error if the string cannot be converted into the object key.
function User_Setting_Key (Id : in String) return ADO.Objects.Object_Key;
Null_User_Setting : constant User_Setting_Ref;
function "=" (Left, Right : User_Setting_Ref'Class) return Boolean;
-- Set the user setting identifier.
procedure Set_Id (Object : in out User_Setting_Ref;
Value : in ADO.Identifier);
-- Get the user setting identifier.
function Get_Id (Object : in User_Setting_Ref)
return ADO.Identifier;
-- Set the setting value.
procedure Set_Value (Object : in out User_Setting_Ref;
Value : in Ada.Strings.Unbounded.Unbounded_String);
procedure Set_Value (Object : in out User_Setting_Ref;
Value : in String);
-- Get the setting value.
function Get_Value (Object : in User_Setting_Ref)
return Ada.Strings.Unbounded.Unbounded_String;
function Get_Value (Object : in User_Setting_Ref)
return String;
-- Get the setting optimistic lock version.
function Get_Version (Object : in User_Setting_Ref)
return Integer;
-- Set the setting that correspond to the value.
procedure Set_Setting (Object : in out User_Setting_Ref;
Value : in Setting_Ref'Class);
-- Get the setting that correspond to the value.
function Get_Setting (Object : in User_Setting_Ref)
return Setting_Ref'Class;
-- Set the user to which the setting value is associated.
procedure Set_User (Object : in out User_Setting_Ref;
Value : in AWA.Users.Models.User_Ref'Class);
-- Get the user to which the setting value is associated.
function Get_User (Object : in User_Setting_Ref)
return AWA.Users.Models.User_Ref'Class;
-- Load the entity identified by 'Id'.
-- Raises the NOT_FOUND exception if it does not exist.
procedure Load (Object : in out User_Setting_Ref;
Session : in out ADO.Sessions.Session'Class;
Id : in ADO.Identifier);
-- Load the entity identified by 'Id'.
-- Returns True in <b>Found</b> if the object was found and False if it does not exist.
procedure Load (Object : in out User_Setting_Ref;
Session : in out ADO.Sessions.Session'Class;
Id : in ADO.Identifier;
Found : out Boolean);
-- Reload from the database the same object if it was modified.
-- Returns True in `Updated` if the object was reloaded.
-- Raises the NOT_FOUND exception if it does not exist.
procedure Reload (Object : in out User_Setting_Ref;
Session : in out ADO.Sessions.Session'Class;
Updated : out Boolean);
-- Find and load the entity.
overriding
procedure Find (Object : in out User_Setting_Ref;
Session : in out ADO.Sessions.Session'Class;
Query : in ADO.SQL.Query'Class;
Found : out Boolean);
-- Save the entity. If the entity does not have an identifier, an identifier is allocated
-- and it is inserted in the table. Otherwise, only data fields which have been changed
-- are updated.
overriding
procedure Save (Object : in out User_Setting_Ref;
Session : in out ADO.Sessions.Master_Session'Class);
-- Delete the entity.
overriding
procedure Delete (Object : in out User_Setting_Ref;
Session : in out ADO.Sessions.Master_Session'Class);
overriding
function Get_Value (From : in User_Setting_Ref;
Name : in String) return Util.Beans.Objects.Object;
-- Table definition
USER_SETTING_TABLE : constant ADO.Schemas.Class_Mapping_Access;
-- Internal method to allocate the Object_Record instance
overriding
procedure Allocate (Object : in out User_Setting_Ref);
-- Copy of the object.
procedure Copy (Object : in User_Setting_Ref;
Into : in out User_Setting_Ref);
private
SETTING_NAME : aliased constant String := "awa_setting";
COL_0_1_NAME : aliased constant String := "id";
COL_1_1_NAME : aliased constant String := "name";
SETTING_DEF : aliased constant ADO.Schemas.Class_Mapping :=
(Count => 2,
Table => SETTING_NAME'Access,
Members => (
1 => COL_0_1_NAME'Access,
2 => COL_1_1_NAME'Access)
);
SETTING_TABLE : constant ADO.Schemas.Class_Mapping_Access
:= SETTING_DEF'Access;
Null_Setting : constant Setting_Ref
:= Setting_Ref'(ADO.Objects.Object_Ref with null record);
type Setting_Impl is
new ADO.Objects.Object_Record (Key_Type => ADO.Objects.KEY_INTEGER,
Of_Class => SETTING_DEF'Access)
with record
Name : Ada.Strings.Unbounded.Unbounded_String;
end record;
type Setting_Access is access all Setting_Impl;
overriding
procedure Destroy (Object : access Setting_Impl);
overriding
procedure Find (Object : in out Setting_Impl;
Session : in out ADO.Sessions.Session'Class;
Query : in ADO.SQL.Query'Class;
Found : out Boolean);
overriding
procedure Load (Object : in out Setting_Impl;
Session : in out ADO.Sessions.Session'Class);
procedure Load (Object : in out Setting_Impl;
Stmt : in out ADO.Statements.Query_Statement'Class;
Session : in out ADO.Sessions.Session'Class);
overriding
procedure Save (Object : in out Setting_Impl;
Session : in out ADO.Sessions.Master_Session'Class);
overriding
procedure Create (Object : in out Setting_Impl;
Session : in out ADO.Sessions.Master_Session'Class);
overriding
procedure Delete (Object : in out Setting_Impl;
Session : in out ADO.Sessions.Master_Session'Class);
procedure Set_Field (Object : in out Setting_Ref'Class;
Impl : out Setting_Access);
GLOBAL_SETTING_NAME : aliased constant String := "awa_global_setting";
COL_0_2_NAME : aliased constant String := "id";
COL_1_2_NAME : aliased constant String := "value";
COL_2_2_NAME : aliased constant String := "version";
COL_3_2_NAME : aliased constant String := "server_id";
COL_4_2_NAME : aliased constant String := "setting_id";
GLOBAL_SETTING_DEF : aliased constant ADO.Schemas.Class_Mapping :=
(Count => 5,
Table => GLOBAL_SETTING_NAME'Access,
Members => (
1 => COL_0_2_NAME'Access,
2 => COL_1_2_NAME'Access,
3 => COL_2_2_NAME'Access,
4 => COL_3_2_NAME'Access,
5 => COL_4_2_NAME'Access)
);
GLOBAL_SETTING_TABLE : constant ADO.Schemas.Class_Mapping_Access
:= GLOBAL_SETTING_DEF'Access;
Null_Global_Setting : constant Global_Setting_Ref
:= Global_Setting_Ref'(ADO.Objects.Object_Ref with null record);
type Global_Setting_Impl is
new ADO.Objects.Object_Record (Key_Type => ADO.Objects.KEY_INTEGER,
Of_Class => GLOBAL_SETTING_DEF'Access)
with record
Value : Ada.Strings.Unbounded.Unbounded_String;
Version : Integer;
Server_Id : Integer;
Setting : Setting_Ref;
end record;
type Global_Setting_Access is access all Global_Setting_Impl;
overriding
procedure Destroy (Object : access Global_Setting_Impl);
overriding
procedure Find (Object : in out Global_Setting_Impl;
Session : in out ADO.Sessions.Session'Class;
Query : in ADO.SQL.Query'Class;
Found : out Boolean);
overriding
procedure Load (Object : in out Global_Setting_Impl;
Session : in out ADO.Sessions.Session'Class);
procedure Load (Object : in out Global_Setting_Impl;
Stmt : in out ADO.Statements.Query_Statement'Class;
Session : in out ADO.Sessions.Session'Class);
overriding
procedure Save (Object : in out Global_Setting_Impl;
Session : in out ADO.Sessions.Master_Session'Class);
overriding
procedure Create (Object : in out Global_Setting_Impl;
Session : in out ADO.Sessions.Master_Session'Class);
overriding
procedure Delete (Object : in out Global_Setting_Impl;
Session : in out ADO.Sessions.Master_Session'Class);
procedure Set_Field (Object : in out Global_Setting_Ref'Class;
Impl : out Global_Setting_Access);
USER_SETTING_NAME : aliased constant String := "awa_user_setting";
COL_0_3_NAME : aliased constant String := "id";
COL_1_3_NAME : aliased constant String := "value";
COL_2_3_NAME : aliased constant String := "version";
COL_3_3_NAME : aliased constant String := "setting_id";
COL_4_3_NAME : aliased constant String := "user_id";
USER_SETTING_DEF : aliased constant ADO.Schemas.Class_Mapping :=
(Count => 5,
Table => USER_SETTING_NAME'Access,
Members => (
1 => COL_0_3_NAME'Access,
2 => COL_1_3_NAME'Access,
3 => COL_2_3_NAME'Access,
4 => COL_3_3_NAME'Access,
5 => COL_4_3_NAME'Access)
);
USER_SETTING_TABLE : constant ADO.Schemas.Class_Mapping_Access
:= USER_SETTING_DEF'Access;
Null_User_Setting : constant User_Setting_Ref
:= User_Setting_Ref'(ADO.Objects.Object_Ref with null record);
type User_Setting_Impl is
new ADO.Objects.Object_Record (Key_Type => ADO.Objects.KEY_INTEGER,
Of_Class => USER_SETTING_DEF'Access)
with record
Value : Ada.Strings.Unbounded.Unbounded_String;
Version : Integer;
Setting : Setting_Ref;
User : AWA.Users.Models.User_Ref;
end record;
type User_Setting_Access is access all User_Setting_Impl;
overriding
procedure Destroy (Object : access User_Setting_Impl);
overriding
procedure Find (Object : in out User_Setting_Impl;
Session : in out ADO.Sessions.Session'Class;
Query : in ADO.SQL.Query'Class;
Found : out Boolean);
overriding
procedure Load (Object : in out User_Setting_Impl;
Session : in out ADO.Sessions.Session'Class);
procedure Load (Object : in out User_Setting_Impl;
Stmt : in out ADO.Statements.Query_Statement'Class;
Session : in out ADO.Sessions.Session'Class);
overriding
procedure Save (Object : in out User_Setting_Impl;
Session : in out ADO.Sessions.Master_Session'Class);
overriding
procedure Create (Object : in out User_Setting_Impl;
Session : in out ADO.Sessions.Master_Session'Class);
overriding
procedure Delete (Object : in out User_Setting_Impl;
Session : in out ADO.Sessions.Master_Session'Class);
procedure Set_Field (Object : in out User_Setting_Ref'Class;
Impl : out User_Setting_Access);
end AWA.Settings.Models;
|
onox/sdlada | Ada | 2,268 | adb | --------------------------------------------------------------------------------------------------------------------
-- Copyright (c) 2013-2018 Luke A. Guest
--
-- This software is provided 'as-is', without any express or implied
-- warranty. In no event will the authors be held liable for any damages
-- arising from the use of this software.
--
-- Permission is granted to anyone to use this software for any purpose,
-- including commercial applications, and to alter it and redistribute it
-- freely, subject to the following restrictions:
--
-- 1. The origin of this software must not be misrepresented; you must not
-- claim that you wrote the original software. If you use this software
-- in a product, an acknowledgment in the product documentation would be
-- appreciated but is not required.
--
-- 2. Altered source versions must be plainly marked as such, and must not be
-- misrepresented as being the original software.
--
-- 3. This notice may not be removed or altered from any source
-- distribution.
--------------------------------------------------------------------------------------------------------------------
with Interfaces.C;
with Interfaces.C.Strings;
with System;
package body SDL.Versions is
package C renames Interfaces.C;
function Revision return String is
function SDL_Get_Revision return C.Strings.chars_ptr with
Import => True,
Convention => C,
External_Name => "SDL_GetRevision";
C_Str : C.Strings.chars_ptr := SDL_Get_Revision;
begin
return C.Strings.Value (C_Str);
end Revision;
function Revision return Revision_Level is
function SDL_Get_Revision_Number return C.int with
Import => True,
Convention => C,
External_Name => "SDL_GetRevisionNumber";
begin
return Revision_Level (SDL_Get_Revision_Number);
end Revision;
procedure Linked_With (Info : in out Version) is
procedure SDL_Get_Version (V : access Version) with
Import => True,
Convention => C,
External_Name => "SDL_GetVersion";
Data : aliased Version;
begin
SDL_Get_Version (Data'Access);
Info := Data;
end Linked_With;
end SDL.Versions;
|
Subsets and Splits
No community queries yet
The top public SQL queries from the community will appear here once available.