repo_name
stringlengths 9
74
| language
stringclasses 1
value | length_bytes
int64 11
9.34M
| extension
stringclasses 2
values | content
stringlengths 11
9.34M
|
---|---|---|---|---|
reznikmm/matreshka | Ada | 3,666 | ads | ------------------------------------------------------------------------------
-- --
-- Matreshka Project --
-- --
-- Ada Modeling Framework --
-- --
-- Runtime Library Component --
-- --
------------------------------------------------------------------------------
-- --
-- Copyright © 2011-2012, Vadim Godunko <[email protected]> --
-- All rights reserved. --
-- --
-- Redistribution and use in source and binary forms, with or without --
-- modification, are permitted provided that the following conditions --
-- are met: --
-- --
-- * Redistributions of source code must retain the above copyright --
-- notice, this list of conditions and the following disclaimer. --
-- --
-- * Redistributions in binary form must reproduce the above copyright --
-- notice, this list of conditions and the following disclaimer in the --
-- documentation and/or other materials provided with the distribution. --
-- --
-- * Neither the name of the Vadim Godunko, IE nor the names of its --
-- contributors may be used to endorse or promote products derived from --
-- this software without specific prior written permission. --
-- --
-- THIS SOFTWARE IS PROVIDED BY THE COPYRIGHT HOLDERS AND CONTRIBUTORS --
-- "AS IS" AND ANY EXPRESS OR IMPLIED WARRANTIES, INCLUDING, BUT NOT --
-- LIMITED TO, THE IMPLIED WARRANTIES OF MERCHANTABILITY AND FITNESS FOR --
-- A PARTICULAR PURPOSE ARE DISCLAIMED. IN NO EVENT SHALL THE COPYRIGHT --
-- HOLDER OR CONTRIBUTORS BE LIABLE FOR ANY DIRECT, INDIRECT, INCIDENTAL, --
-- SPECIAL, EXEMPLARY, OR CONSEQUENTIAL DAMAGES (INCLUDING, BUT NOT LIMITED --
-- TO, PROCUREMENT OF SUBSTITUTE GOODS OR SERVICES; LOSS OF USE, DATA, OR --
-- PROFITS; OR BUSINESS INTERRUPTION) HOWEVER CAUSED AND ON ANY THEORY OF --
-- LIABILITY, WHETHER IN CONTRACT, STRICT LIABILITY, OR TORT (INCLUDING --
-- NEGLIGENCE OR OTHERWISE) ARISING IN ANY WAY OUT OF THE USE OF THIS --
-- SOFTWARE, EVEN IF ADVISED OF THE POSSIBILITY OF SUCH DAMAGE. --
-- --
------------------------------------------------------------------------------
-- $Revision$ $Date$
------------------------------------------------------------------------------
-- This file is generated, don't edit it.
------------------------------------------------------------------------------
with AMF.Elements.Generic_Hash;
function AMF.UML.Redefinable_Template_Signatures.Hash is
new AMF.Elements.Generic_Hash (UML_Redefinable_Template_Signature, UML_Redefinable_Template_Signature_Access);
|
reznikmm/matreshka | Ada | 6,829 | 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$
------------------------------------------------------------------------------
-- This file is generated, don't edit it.
------------------------------------------------------------------------------
with AMF.Elements;
with AMF.Internals.Helpers;
with AMF.Internals.Tables.UML_Attributes;
with AMF.UML.Artifacts;
with AMF.Visitors.Standard_Profile_L2_Iterators;
with AMF.Visitors.Standard_Profile_L2_Visitors;
package body AMF.Internals.Standard_Profile_L2_Scripts is
-----------------------
-- Get_Base_Artifact --
-----------------------
overriding function Get_Base_Artifact
(Self : not null access constant Standard_Profile_L2_Script_Proxy)
return AMF.UML.Artifacts.UML_Artifact_Access is
begin
return
AMF.UML.Artifacts.UML_Artifact_Access
(AMF.Internals.Helpers.To_Element
(AMF.Internals.Tables.UML_Attributes.Internal_Get_Base_Artifact
(Self.Element)));
end Get_Base_Artifact;
-----------------------
-- Set_Base_Artifact --
-----------------------
overriding procedure Set_Base_Artifact
(Self : not null access Standard_Profile_L2_Script_Proxy;
To : AMF.UML.Artifacts.UML_Artifact_Access) is
begin
AMF.Internals.Tables.UML_Attributes.Internal_Set_Base_Artifact
(Self.Element,
AMF.Internals.Helpers.To_Element
(AMF.Elements.Element_Access (To)));
end Set_Base_Artifact;
-------------------
-- Enter_Element --
-------------------
overriding procedure Enter_Element
(Self : not null access constant Standard_Profile_L2_Script_Proxy;
Visitor : in out AMF.Visitors.Abstract_Visitor'Class;
Control : in out AMF.Visitors.Traverse_Control) is
begin
if Visitor in AMF.Visitors.Standard_Profile_L2_Visitors.Standard_Profile_L2_Visitor'Class then
AMF.Visitors.Standard_Profile_L2_Visitors.Standard_Profile_L2_Visitor'Class
(Visitor).Enter_Script
(AMF.Standard_Profile_L2.Scripts.Standard_Profile_L2_Script_Access (Self),
Control);
end if;
end Enter_Element;
-------------------
-- Leave_Element --
-------------------
overriding procedure Leave_Element
(Self : not null access constant Standard_Profile_L2_Script_Proxy;
Visitor : in out AMF.Visitors.Abstract_Visitor'Class;
Control : in out AMF.Visitors.Traverse_Control) is
begin
if Visitor in AMF.Visitors.Standard_Profile_L2_Visitors.Standard_Profile_L2_Visitor'Class then
AMF.Visitors.Standard_Profile_L2_Visitors.Standard_Profile_L2_Visitor'Class
(Visitor).Leave_Script
(AMF.Standard_Profile_L2.Scripts.Standard_Profile_L2_Script_Access (Self),
Control);
end if;
end Leave_Element;
-------------------
-- Visit_Element --
-------------------
overriding procedure Visit_Element
(Self : not null access constant Standard_Profile_L2_Script_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.Standard_Profile_L2_Iterators.Standard_Profile_L2_Iterator'Class then
AMF.Visitors.Standard_Profile_L2_Iterators.Standard_Profile_L2_Iterator'Class
(Iterator).Visit_Script
(Visitor,
AMF.Standard_Profile_L2.Scripts.Standard_Profile_L2_Script_Access (Self),
Control);
end if;
end Visit_Element;
end AMF.Internals.Standard_Profile_L2_Scripts;
|
albertklee/SPARKZumo | Ada | 3,255 | ads | pragma SPARK_Mode;
with Types; use Types;
-- @summary
-- Interface for reading infrared sensors
--
-- @description
-- This package exposes the interface used to read values from the IR sensors
--
package Zumo_QTR is
-- Represents the maximum and minimum values found by a sensor during
-- a calibration sequence
-- @field Min the minimum value found during a calibration sequence
-- @field Max the maximum value found during a calibration sequence
type Calibration is record
Min : Sensor_Value := Sensor_Value'Last;
Max : Sensor_Value := Sensor_Value'First;
end record;
type Calibration_Array is array (1 .. 6) of Calibration;
-- The list of calibrationm values with the IR leds on
Cal_Vals_On : Calibration_Array;
-- The list of calibration values with the IR leds off
Cal_Vals_Off : Calibration_Array;
-- True if a calibration was performed with the IR Leds on
Calibrated_On : Boolean := False;
-- True if a calibration was performed with the IR Leds off
Calibrated_Off : Boolean := False;
-- True if the init was called
Initd : Boolean := False;
-- Inits the package by muxing pins and whatnot
procedure Init
with Pre => not Initd,
Post => Initd;
-- Reads values from the sensors
-- @param Sensor_Values the array of values read from sensors
-- @param ReadMode the mode to read the sensors in (LEDs on or off)
procedure Read_Sensors (Sensor_Values : out Sensor_Array;
ReadMode : Sensor_Read_Mode)
with Pre => Initd;
-- Turns the IR leds on or off
-- @param On True to turn on the IR leds, False to turn off
procedure ChangeEmitters (On : Boolean)
with Global => null;
-- Performs a calibration routine with the sensors
-- @param ReadMode emitters on or off during calibration
procedure Calibrate (ReadMode : Sensor_Read_Mode := Emitters_On)
with Global => (Proof_In => Initd,
In_Out => (Cal_Vals_On,
Cal_Vals_Off),
Output => (Calibrated_On,
Calibrated_Off)),
Pre => Initd;
-- Resets the stored calibration data
-- @param ReadMode which calibration data to reset
procedure ResetCalibration (ReadMode : Sensor_Read_Mode);
-- Reads the sensors and offsets using the calibrated values
-- @param Sensor_Values values read from sensors are returned here
-- @param ReadMode whether to read with emitters on or off
procedure ReadCalibrated (Sensor_Values : out Sensor_Array;
ReadMode : Sensor_Read_Mode)
with Pre => Initd;
private
-- The actual read work is done here
-- @param Sensor_Values the sensor values are returned here
procedure Read_Private (Sensor_Values : out Sensor_Array)
with Pre => Initd;
-- The actual calibration work is done here
-- @param Cal_Vals the calibration array to modify
-- @param ReadMode calibrate with emitters on or off
procedure Calibrate_Private (Cal_Vals : in out Calibration_Array;
ReadMode : Sensor_Read_Mode)
with Global => (Proof_In => Initd),
Pre => Initd;
end Zumo_QTR;
|
reznikmm/matreshka | Ada | 4,827 | ads | ------------------------------------------------------------------------------
-- --
-- Matreshka Project --
-- --
-- Open Document Toolkit --
-- --
-- Runtime Library Component --
-- --
------------------------------------------------------------------------------
-- --
-- Copyright © 2014, Vadim Godunko <[email protected]> --
-- All rights reserved. --
-- --
-- Redistribution and use in source and binary forms, with or without --
-- modification, are permitted provided that the following conditions --
-- are met: --
-- --
-- * Redistributions of source code must retain the above copyright --
-- notice, this list of conditions and the following disclaimer. --
-- --
-- * Redistributions in binary form must reproduce the above copyright --
-- notice, this list of conditions and the following disclaimer in the --
-- documentation and/or other materials provided with the distribution. --
-- --
-- * Neither the name of the Vadim Godunko, IE nor the names of its --
-- contributors may be used to endorse or promote products derived from --
-- this software without specific prior written permission. --
-- --
-- THIS SOFTWARE IS PROVIDED BY THE COPYRIGHT HOLDERS AND CONTRIBUTORS --
-- "AS IS" AND ANY EXPRESS OR IMPLIED WARRANTIES, INCLUDING, BUT NOT --
-- LIMITED TO, THE IMPLIED WARRANTIES OF MERCHANTABILITY AND FITNESS FOR --
-- A PARTICULAR PURPOSE ARE DISCLAIMED. IN NO EVENT SHALL THE COPYRIGHT --
-- HOLDER OR CONTRIBUTORS BE LIABLE FOR ANY DIRECT, INDIRECT, INCIDENTAL, --
-- SPECIAL, EXEMPLARY, OR CONSEQUENTIAL DAMAGES (INCLUDING, BUT NOT LIMITED --
-- TO, PROCUREMENT OF SUBSTITUTE GOODS OR SERVICES; LOSS OF USE, DATA, OR --
-- PROFITS; OR BUSINESS INTERRUPTION) HOWEVER CAUSED AND ON ANY THEORY OF --
-- LIABILITY, WHETHER IN CONTRACT, STRICT LIABILITY, OR TORT (INCLUDING --
-- NEGLIGENCE OR OTHERWISE) ARISING IN ANY WAY OUT OF THE USE OF THIS --
-- SOFTWARE, EVEN IF ADVISED OF THE POSSIBILITY OF SUCH DAMAGE. --
-- --
------------------------------------------------------------------------------
-- $Revision$ $Date$
------------------------------------------------------------------------------
with XML.DOM.Visitors;
with ODF.DOM.Text_Index_Entry_Tab_Stop_Elements;
package Matreshka.ODF_Text.Index_Entry_Tab_Stop_Elements is
type Text_Index_Entry_Tab_Stop_Element_Node is
new Matreshka.ODF_Text.Abstract_Text_Element_Node
and ODF.DOM.Text_Index_Entry_Tab_Stop_Elements.ODF_Text_Index_Entry_Tab_Stop
with null record;
overriding function Create
(Parameters : not null access Matreshka.DOM_Elements.Element_L2_Parameters)
return Text_Index_Entry_Tab_Stop_Element_Node;
overriding function Get_Local_Name
(Self : not null access constant Text_Index_Entry_Tab_Stop_Element_Node)
return League.Strings.Universal_String;
overriding procedure Enter_Node
(Self : not null access Text_Index_Entry_Tab_Stop_Element_Node;
Visitor : in out XML.DOM.Visitors.Abstract_Visitor'Class;
Control : in out XML.DOM.Visitors.Traverse_Control);
overriding procedure Leave_Node
(Self : not null access Text_Index_Entry_Tab_Stop_Element_Node;
Visitor : in out XML.DOM.Visitors.Abstract_Visitor'Class;
Control : in out XML.DOM.Visitors.Traverse_Control);
overriding procedure Visit_Node
(Self : not null access Text_Index_Entry_Tab_Stop_Element_Node;
Iterator : in out XML.DOM.Visitors.Abstract_Iterator'Class;
Visitor : in out XML.DOM.Visitors.Abstract_Visitor'Class;
Control : in out XML.DOM.Visitors.Traverse_Control);
end Matreshka.ODF_Text.Index_Entry_Tab_Stop_Elements;
|
zhmu/ananas | Ada | 247 | adb | -- { dg-do run }
procedure Float_Value2 is
F1 : Long_Long_Float := Long_Long_Float'Value ("1.e40");
F2 : Long_Long_Float := Long_Long_Float'Value ("1.0e40");
begin
if F1 /= F2 then
raise Program_Error;
end if;
end Float_Value2; |
melwyncarlo/ProjectEuler | Ada | 5,168 | adb | with Ada.Integer_Text_IO;
-- Copyright 2021 Melwyn Francis Carlo
procedure A011 is
use Ada.Integer_Text_IO;
type Array_1D_Bool is array (Integer range 1 .. 3) of Boolean;
type Array_2D_Int is array (Integer range 1 .. 20,
Integer range 1 .. 20) of Integer;
Is_RC_Safe : Array_1D_Bool;
Temp_Product : Integer;
Max_Product : Integer := 1788695;
Grid : constant Array_2D_Int := (
(8, 02, 22, 97, 38, 15, 00, 40, 00, 75,
04, 05, 07, 78, 52, 12, 50, 77, 91, 8),
(49, 49, 99, 40, 17, 81, 18, 57, 60, 87,
17, 40, 98, 43, 69, 48, 04, 56, 62, 00),
(81, 49, 31, 73, 55, 79, 14, 29, 93, 71,
40, 67, 53, 88, 30, 03, 49, 13, 36, 65),
(52, 70, 95, 23, 04, 60, 11, 42, 69, 24,
68, 56, 01, 32, 56, 71, 37, 02, 36, 91),
(22, 31, 16, 71, 51, 67, 63, 89, 41, 92,
36, 54, 22, 40, 40, 28, 66, 33, 13, 80),
(24, 47, 32, 60, 99, 03, 45, 02, 44, 75,
33, 53, 78, 36, 84, 20, 35, 17, 12, 50),
(32, 98, 81, 28, 64, 23, 67, 10, 26, 38,
40, 67, 59, 54, 70, 66, 18, 38, 64, 70),
(67, 26, 20, 68, 02, 62, 12, 20, 95, 63,
94, 39, 63, 8, 40, 91, 66, 49, 94, 21),
(24, 55, 58, 05, 66, 73, 99, 26, 97, 17,
78, 78, 96, 83, 14, 88, 34, 89, 63, 72),
(21, 36, 23, 9, 75, 00, 76, 44, 20, 45,
35, 14, 00, 61, 33, 97, 34, 31, 33, 95),
(78, 17, 53, 28, 22, 75, 31, 67, 15, 94,
03, 80, 04, 62, 16, 14, 9, 53, 56, 92),
(16, 39, 05, 42, 96, 35, 31, 47, 55, 58,
88, 24, 00, 17, 54, 24, 36, 29, 85, 57),
(86, 56, 00, 48, 35, 71, 89, 07, 05, 44,
44, 37, 44, 60, 21, 58, 51, 54, 17, 58),
(19, 80, 81, 68, 05, 94, 47, 69, 28, 73,
92, 13, 86, 52, 17, 77, 04, 89, 55, 40),
(04, 52, 8, 83, 97, 35, 99, 16, 07, 97,
57, 32, 16, 26, 26, 79, 33, 27, 98, 66),
(88, 36, 68, 87, 57, 62, 20, 72, 03, 46,
33, 67, 46, 55, 12, 32, 63, 93, 53, 69),
(04, 42, 16, 73, 38, 25, 39, 11, 24, 94,
72, 18, 8, 46, 29, 32, 40, 62, 76, 36),
(20, 69, 36, 41, 72, 30, 23, 88, 34, 62,
99, 69, 82, 67, 59, 85, 74, 04, 36, 16),
(20, 73, 35, 29, 78, 31, 90, 01, 74, 31,
49, 71, 48, 86, 81, 16, 23, 57, 05, 54),
(01, 70, 54, 71, 83, 51, 54, 69, 16, 92,
33, 48, 61, 43, 52, 01, 89, 19, 67, 48)
);
begin
for I in 1 .. 20 loop
for J in 1 .. 20 loop
Is_RC_Safe := (False, False, False);
if (I + 3) <= 20 then
if ((Grid (I, J) /= 0) and (Grid (I + 1, J) /= 0)
and (Grid (I + 2, J) /= 0) and (Grid (I + 3, J) /= 0)
and ((Grid (I, J) > 50) or (Grid (I + 1, J) > 50)
or (Grid (I + 2, J) > 50) or (Grid (I + 3, J) > 50)))
then
Temp_Product := Grid (I, J) * Grid (I + 1, J)
* Grid (I + 2, J) * Grid (I + 3, J);
if (Temp_Product > Max_Product) then
Max_Product := Temp_Product;
end if;
Is_RC_Safe (1) := True;
end if;
end if;
if (J + 3) <= 20 then
if ((Grid (I, J) /= 0) and (Grid (I, J + 1) /= 0)
and (Grid (I, J + 2) /= 0) and (Grid (I, J + 3) /= 0)
and ((Grid (I, J) > 50) or (Grid (I, J + 1) > 50)
or (Grid (I, J + 2) > 50) or (Grid (I, J + 3) > 50)))
then
Temp_Product := Grid (I, J) * Grid (I, J + 1)
* Grid (I, J + 2) * Grid (I, J + 3);
if (Temp_Product > Max_Product) then
Max_Product := Temp_Product;
end if;
Is_RC_Safe (2) := True;
end if;
end if;
if (I > 3 and Is_RC_Safe (2)) then
Is_RC_Safe (3) := True;
end if;
if (Is_RC_Safe (1) and Is_RC_Safe (2)) then
if ((Grid (I + 1, J + 1) /= 0) and (Grid (I + 2, J + 2) /= 0)
and (Grid (I + 3, J + 3) /= 0)
and ((Grid (I + 1, J + 1) > 50) or (Grid (I + 2, J + 2) > 50)
or (Grid (I + 3, J + 3) > 50)))
then
Temp_Product := Grid (I, J) * Grid (I + 1, J + 1)
* Grid (I + 2, J + 2) * Grid (I + 3, J + 3);
if (Temp_Product > Max_Product) then
Max_Product := Temp_Product;
end if;
end if;
end if;
if Is_RC_Safe (3) then
if ((Grid (I - 1, J + 1) /= 0) and (Grid (I - 2, J + 2) /= 0)
and (Grid (I - 3, J + 3) /= 0)
and ((Grid (I - 1, J + 1) > 50) or (Grid (I - 2, J + 2) > 50)
or (Grid (I - 3, J + 3) > 50)))
then
Temp_Product := Grid (I, J) * Grid (I - 1, J + 1)
* Grid (I - 2, J + 2) * Grid (I - 3, J + 3);
if (Temp_Product > Max_Product) then
Max_Product := Temp_Product;
end if;
end if;
end if;
end loop;
end loop;
Put (Max_Product, Width => 0);
end A011;
|
greifentor/archimedes-legacy | Ada | 66,223 | ads | <Diagramm>
<AdditionalSQLCode>
<SQLCode>
<AdditionalSQLCodePostChanging></AdditionalSQLCodePostChanging>
<AdditionalSQLCodePostReducing></AdditionalSQLCodePostReducing>
<AdditionalSQLCodePreChanging></AdditionalSQLCodePreChanging>
<AdditionalSQLCodePreExtending></AdditionalSQLCodePreExtending>
</SQLCode>
</AdditionalSQLCode>
<Colors>
<Anzahl>23</Anzahl>
<Color0>
<B>255</B>
<G>0</G>
<Name>blau</Name>
<R>0</R>
</Color0>
<Color1>
<B>221</B>
<G>212</G>
<Name>blaugrau</Name>
<R>175</R>
</Color1>
<Color10>
<B>192</B>
<G>192</G>
<Name>hellgrau</Name>
<R>192</R>
</Color10>
<Color11>
<B>255</B>
<G>0</G>
<Name>kamesinrot</Name>
<R>255</R>
</Color11>
<Color12>
<B>0</B>
<G>200</G>
<Name>orange</Name>
<R>255</R>
</Color12>
<Color13>
<B>255</B>
<G>247</G>
<Name>pastell-blau</Name>
<R>211</R>
</Color13>
<Color14>
<B>186</B>
<G>245</G>
<Name>pastell-gelb</Name>
<R>255</R>
</Color14>
<Color15>
<B>234</B>
<G>255</G>
<Name>pastell-gr&uuml;n</Name>
<R>211</R>
</Color15>
<Color16>
<B>255</B>
<G>211</G>
<Name>pastell-lila</Name>
<R>244</R>
</Color16>
<Color17>
<B>191</B>
<G>165</G>
<Name>pastell-rot</Name>
<R>244</R>
</Color17>
<Color18>
<B>175</B>
<G>175</G>
<Name>pink</Name>
<R>255</R>
</Color18>
<Color19>
<B>0</B>
<G>0</G>
<Name>rot</Name>
<R>255</R>
</Color19>
<Color2>
<B>61</B>
<G>125</G>
<Name>braun</Name>
<R>170</R>
</Color2>
<Color20>
<B>0</B>
<G>0</G>
<Name>schwarz</Name>
<R>0</R>
</Color20>
<Color21>
<B>255</B>
<G>255</G>
<Name>t&uuml;rkis</Name>
<R>0</R>
</Color21>
<Color22>
<B>255</B>
<G>255</G>
<Name>wei&szlig;</Name>
<R>255</R>
</Color22>
<Color3>
<B>64</B>
<G>64</G>
<Name>dunkelgrau</Name>
<R>64</R>
</Color3>
<Color4>
<B>84</B>
<G>132</G>
<Name>dunkelgr&uuml;n</Name>
<R>94</R>
</Color4>
<Color5>
<B>0</B>
<G>255</G>
<Name>gelb</Name>
<R>255</R>
</Color5>
<Color6>
<B>0</B>
<G>225</G>
<Name>goldgelb</Name>
<R>255</R>
</Color6>
<Color7>
<B>128</B>
<G>128</G>
<Name>grau</Name>
<R>128</R>
</Color7>
<Color8>
<B>0</B>
<G>255</G>
<Name>gr&uuml;n</Name>
<R>0</R>
</Color8>
<Color9>
<B>255</B>
<G>212</G>
<Name>hellblau</Name>
<R>191</R>
</Color9>
</Colors>
<ComplexIndices>
<IndexCount>0</IndexCount>
</ComplexIndices>
<DataSource>
<Import>
<DBName></DBName>
<Description></Description>
<Domains>false</Domains>
<Driver></Driver>
<Name></Name>
<Referenzen>false</Referenzen>
<User></User>
</Import>
</DataSource>
<DatabaseConnections>
<Count>2</Count>
<DatabaseConnection0>
<DBExecMode>POSTGRESQL</DBExecMode>
<Driver>org.postgresql.Driver</Driver>
<Name>Test-DB (Postgre)</Name>
<Quote>"</Quote>
<SetDomains>false</SetDomains>
<SetNotNull>true</SetNotNull>
<SetReferences>true</SetReferences>
<URL>jdbc:postgresql://mykene/TEST_OLI_ISIS_2</URL>
<UserName>op1</UserName>
</DatabaseConnection0>
<DatabaseConnection1>
<DBExecMode>HSQL</DBExecMode>
<Driver>org.hsqldb.jdbcDriver</Driver>
<Name>Test-DB (HSQL)</Name>
<Quote>"</Quote>
<SetDomains>false</SetDomains>
<SetNotNull>true</SetNotNull>
<SetReferences>true</SetReferences>
<URL>jdbc:hsqldb:unittests/db/tst</URL>
<UserName>sa</UserName>
</DatabaseConnection1>
</DatabaseConnections>
<DefaultComment>
<Anzahl>0</Anzahl>
</DefaultComment>
<Domains>
<Anzahl>4</Anzahl>
<Domain0>
<Datatype>-5</Datatype>
<History></History>
<Initialwert>NULL</Initialwert>
<Kommentar></Kommentar>
<Length>0</Length>
<NKS>0</NKS>
<Name>Ident</Name>
<Parameters></Parameters>
</Domain0>
<Domain1>
<Datatype>12</Datatype>
<History></History>
<Initialwert>NULL</Initialwert>
<Kommentar></Kommentar>
<Length>500</Length>
<NKS>0</NKS>
<Name>LongName</Name>
<Parameters></Parameters>
</Domain1>
<Domain2>
<Datatype>12</Datatype>
<History></History>
<Initialwert>NULL</Initialwert>
<Kommentar></Kommentar>
<Length>200</Length>
<NKS>0</NKS>
<Name>Name</Name>
<Parameters></Parameters>
</Domain2>
<Domain3>
<Datatype>2</Datatype>
<History></History>
<Initialwert>NULL</Initialwert>
<Kommentar></Kommentar>
<Length>8</Length>
<NKS>2</NKS>
<Name>Price</Name>
<Parameters></Parameters>
</Domain3>
</Domains>
<Factories>
<Object>archimedes.legacy.scheme.DefaultObjectFactory</Object>
</Factories>
<Pages>
<PerColumn>5</PerColumn>
<PerRow>10</PerRow>
</Pages>
<Parameter>
<AdditionalSQLScriptListener></AdditionalSQLScriptListener>
<Applicationname></Applicationname>
<AufgehobeneAusblenden>false</AufgehobeneAusblenden>
<Autor>&lt;null&gt;</Autor>
<Basepackagename></Basepackagename>
<CodeFactoryClassName></CodeFactoryClassName>
<Codebasispfad>.\</Codebasispfad>
<DBVersionDBVersionColumn></DBVersionDBVersionColumn>
<DBVersionDescriptionColumn></DBVersionDescriptionColumn>
<DBVersionTablename></DBVersionTablename>
<History></History>
<Kommentar>&lt;null&gt;</Kommentar>
<Name>TST</Name>
<Optionen>
<Anzahl>0</Anzahl>
</Optionen>
<PflichtfelderMarkieren>false</PflichtfelderMarkieren>
<ReferenzierteSpaltenAnzeigen>true</ReferenzierteSpaltenAnzeigen>
<RelationColorExternalTables>hellgrau</RelationColorExternalTables>
<RelationColorRegular>schwarz</RelationColorRegular>
<SchemaName>TST</SchemaName>
<Schriftgroessen>
<Tabelleninhalte>12</Tabelleninhalte>
<Ueberschriften>24</Ueberschriften>
<Untertitel>12</Untertitel>
</Schriftgroessen>
<Scripte>
<AfterWrite>&lt;null&gt;</AfterWrite>
</Scripte>
<TechnischeFelderAusgrauen>false</TechnischeFelderAusgrauen>
<TransienteFelderAusgrauen>false</TransienteFelderAusgrauen>
<UdschebtiBaseClassName></UdschebtiBaseClassName>
<Version>1</Version>
<Versionsdatum>08.12.2015</Versionsdatum>
<Versionskommentar>&lt;null&gt;</Versionskommentar>
</Parameter>
<Sequences>
<Count>2</Count>
<Sequence0>
<Comment></Comment>
<History></History>
<Increment>25</Increment>
<Name>BookIds</Name>
<StartValue>100</StartValue>
</Sequence0>
<Sequence1>
<Comment></Comment>
<History></History>
<Increment>100</Increment>
<Name>TestTableId</Name>
<StartValue>100</StartValue>
</Sequence1>
</Sequences>
<Stereotype>
<Anzahl>0</Anzahl>
</Stereotype>
<Tabellen>
<Anzahl>5</Anzahl>
<Tabelle0>
<Aufgehoben>false</Aufgehoben>
<Codegenerator>
<AuswahlMembers>
<Anzahl>0</Anzahl>
</AuswahlMembers>
<CompareMembers>
<Anzahl>0</Anzahl>
</CompareMembers>
<Equalsmembers>
<Anzahl>0</Anzahl>
</Equalsmembers>
<HashCodeMembers>
<Anzahl>0</Anzahl>
</HashCodeMembers>
<NReferenzen>
<Anzahl>0</Anzahl>
</NReferenzen>
<OrderMembers>
<Anzahl>0</Anzahl>
</OrderMembers>
<ToComboStringMembers>
<Anzahl>0</Anzahl>
</ToComboStringMembers>
<ToStringMembers>
<Anzahl>0</Anzahl>
</ToStringMembers>
</Codegenerator>
<ExternalTable>false</ExternalTable>
<Farben>
<Hintergrund>wei&szlig;</Hintergrund>
<Schrift>schwarz</Schrift>
</Farben>
<FirstGenerationDone>false</FirstGenerationDone>
<History>@changed OLI - Added.</History>
<InDevelopment>false</InDevelopment>
<Kommentar></Kommentar>
<NMRelation>false</NMRelation>
<Name>Book</Name>
<Options>
<Count>0</Count>
</Options>
<Panels>
<Anzahl>1</Anzahl>
<Panel0>
<PanelClass></PanelClass>
<PanelNumber>0</PanelNumber>
<TabMnemonic>1</TabMnemonic>
<TabTitle>1.Daten</TabTitle>
<TabToolTipText>Hier können Sie die Daten des Objekt warten</TabToolTipText>
</Panel0>
</Panels>
<Spalten>
<Anzahl>6</Anzahl>
<Codegenerator>
<ActiveInApplication>false</ActiveInApplication>
<AdditionalCreateConstraints></AdditionalCreateConstraints>
<Codegeneratoroptionen></Codegeneratoroptionen>
<Codeverzeichnis>.</Codeverzeichnis>
<Codieren>true</Codieren>
<DynamicCode>true</DynamicCode>
<Inherited>false</Inherited>
<Kontextname></Kontextname>
<UniqueFormula></UniqueFormula>
</Codegenerator>
<Spalte0>
<AlterInBatch>false</AlterInBatch>
<Aufgehoben>false</Aufgehoben>
<CanBeReferenced>true</CanBeReferenced>
<Disabled>false</Disabled>
<Domain>Ident</Domain>
<Editordescriptor>
<Editormember>false</Editormember>
<LabelText></LabelText>
<MaxCharacters>0</MaxCharacters>
<Mnemonic></Mnemonic>
<Position>0</Position>
<ReferenceWeight>keine</ReferenceWeight>
<RessourceIdentifier></RessourceIdentifier>
<ToolTipText></ToolTipText>
</Editordescriptor>
<ForeignKey>false</ForeignKey>
<Global>false</Global>
<GlobalId>false</GlobalId>
<HideReference>false</HideReference>
<History>@changed OLI - Added.</History>
<IndexSearchMember>false</IndexSearchMember>
<Indexed>false</Indexed>
<IndividualDefaultValue></IndividualDefaultValue>
<Kodiert>false</Kodiert>
<Kommentar></Kommentar>
<Konsistenz>
<Writeablemember>false</Writeablemember>
</Konsistenz>
<LastModificationField>false</LastModificationField>
<ListItemField>false</ListItemField>
<Name>Id</Name>
<NotNull>false</NotNull>
<PanelNumber>0</PanelNumber>
<Parameter></Parameter>
<PrimaryKey>true</PrimaryKey>
<RemovedStateField>false</RemovedStateField>
<SequenceForKeyGeneration></SequenceForKeyGeneration>
<SuppressForeignKeyConstraints>false</SuppressForeignKeyConstraints>
<TechnicalField>false</TechnicalField>
<Transient>false</Transient>
<Unique>false</Unique>
</Spalte0>
<Spalte1>
<AlterInBatch>false</AlterInBatch>
<Aufgehoben>false</Aufgehoben>
<CanBeReferenced>false</CanBeReferenced>
<Disabled>false</Disabled>
<Domain>Ident</Domain>
<Editordescriptor>
<Editormember>false</Editormember>
<LabelText></LabelText>
<MaxCharacters>0</MaxCharacters>
<Mnemonic></Mnemonic>
<Position>0</Position>
<ReferenceWeight>keine</ReferenceWeight>
<RessourceIdentifier></RessourceIdentifier>
<ToolTipText></ToolTipText>
</Editordescriptor>
<ForeignKey>true</ForeignKey>
<Global>false</Global>
<GlobalId>false</GlobalId>
<HideReference>false</HideReference>
<History>@changed OLI - Added.</History>
<IndexSearchMember>false</IndexSearchMember>
<Indexed>false</Indexed>
<IndividualDefaultValue></IndividualDefaultValue>
<Kodiert>false</Kodiert>
<Kommentar></Kommentar>
<Konsistenz>
<Writeablemember>false</Writeablemember>
</Konsistenz>
<LastModificationField>false</LastModificationField>
<ListItemField>false</ListItemField>
<Name>Author</Name>
<NotNull>true</NotNull>
<PanelNumber>0</PanelNumber>
<Parameter></Parameter>
<PrimaryKey>false</PrimaryKey>
<Referenz>
<Direction0>RIGHT</Direction0>
<Direction1>LEFT</Direction1>
<Offset0>25</Offset0>
<Offset1>25</Offset1>
<Spalte>Author</Spalte>
<Tabelle>Author</Tabelle>
<Views>
<Anzahl>1</Anzahl>
<View0>
<Direction0>RIGHT</Direction0>
<Direction1>LEFT</Direction1>
<Name>Main</Name>
<Offset0>25</Offset0>
<Offset1>25</Offset1>
<Points>
<Anzahl>0</Anzahl>
</Points>
</View0>
</Views>
</Referenz>
<RemovedStateField>false</RemovedStateField>
<SequenceForKeyGeneration></SequenceForKeyGeneration>
<SuppressForeignKeyConstraints>false</SuppressForeignKeyConstraints>
<TechnicalField>false</TechnicalField>
<Transient>false</Transient>
<Unique>false</Unique>
</Spalte1>
<Spalte2>
<AlterInBatch>false</AlterInBatch>
<Aufgehoben>false</Aufgehoben>
<CanBeReferenced>false</CanBeReferenced>
<Disabled>false</Disabled>
<Domain>Ident</Domain>
<Editordescriptor>
<Editormember>false</Editormember>
<LabelText></LabelText>
<MaxCharacters>0</MaxCharacters>
<Mnemonic></Mnemonic>
<Position>0</Position>
<ReferenceWeight>keine</ReferenceWeight>
<RessourceIdentifier></RessourceIdentifier>
<ToolTipText></ToolTipText>
</Editordescriptor>
<ForeignKey>true</ForeignKey>
<Global>false</Global>
<GlobalId>false</GlobalId>
<HideReference>false</HideReference>
<History>@changed OLI - Added.</History>
<IndexSearchMember>false</IndexSearchMember>
<Indexed>false</Indexed>
<IndividualDefaultValue></IndividualDefaultValue>
<Kodiert>false</Kodiert>
<Kommentar></Kommentar>
<Konsistenz>
<Writeablemember>false</Writeablemember>
</Konsistenz>
<LastModificationField>false</LastModificationField>
<ListItemField>false</ListItemField>
<Name>Publisher</Name>
<NotNull>true</NotNull>
<PanelNumber>0</PanelNumber>
<Parameter></Parameter>
<PrimaryKey>false</PrimaryKey>
<Referenz>
<Direction0>DOWN</Direction0>
<Direction1>UP</Direction1>
<Offset0>25</Offset0>
<Offset1>25</Offset1>
<Spalte>Id</Spalte>
<Tabelle>Publisher</Tabelle>
<Views>
<Anzahl>1</Anzahl>
<View0>
<Direction0>DOWN</Direction0>
<Direction1>UP</Direction1>
<Name>Main</Name>
<Offset0>25</Offset0>
<Offset1>25</Offset1>
<Points>
<Anzahl>0</Anzahl>
</Points>
</View0>
</Views>
</Referenz>
<RemovedStateField>false</RemovedStateField>
<SequenceForKeyGeneration></SequenceForKeyGeneration>
<SuppressForeignKeyConstraints>false</SuppressForeignKeyConstraints>
<TechnicalField>false</TechnicalField>
<Transient>false</Transient>
<Unique>false</Unique>
</Spalte2>
<Spalte3>
<AlterInBatch>false</AlterInBatch>
<Aufgehoben>false</Aufgehoben>
<CanBeReferenced>false</CanBeReferenced>
<Disabled>false</Disabled>
<Domain>Name</Domain>
<Editordescriptor>
<Editormember>false</Editormember>
<LabelText></LabelText>
<MaxCharacters>0</MaxCharacters>
<Mnemonic></Mnemonic>
<Position>0</Position>
<ReferenceWeight>keine</ReferenceWeight>
<RessourceIdentifier></RessourceIdentifier>
<ToolTipText></ToolTipText>
</Editordescriptor>
<ForeignKey>false</ForeignKey>
<Global>false</Global>
<GlobalId>false</GlobalId>
<HideReference>false</HideReference>
<History>@changed OLI - Added.</History>
<IndexSearchMember>false</IndexSearchMember>
<Indexed>false</Indexed>
<IndividualDefaultValue></IndividualDefaultValue>
<Kodiert>false</Kodiert>
<Kommentar></Kommentar>
<Konsistenz>
<Writeablemember>false</Writeablemember>
</Konsistenz>
<LastModificationField>false</LastModificationField>
<ListItemField>false</ListItemField>
<Name>ISBN</Name>
<NotNull>false</NotNull>
<PanelNumber>0</PanelNumber>
<Parameter></Parameter>
<PrimaryKey>false</PrimaryKey>
<RemovedStateField>false</RemovedStateField>
<SequenceForKeyGeneration></SequenceForKeyGeneration>
<SuppressForeignKeyConstraints>false</SuppressForeignKeyConstraints>
<TechnicalField>false</TechnicalField>
<Transient>false</Transient>
<Unique>false</Unique>
</Spalte3>
<Spalte4>
<AlterInBatch>false</AlterInBatch>
<Aufgehoben>false</Aufgehoben>
<CanBeReferenced>false</CanBeReferenced>
<Disabled>false</Disabled>
<Domain>Price</Domain>
<Editordescriptor>
<Editormember>false</Editormember>
<LabelText></LabelText>
<MaxCharacters>0</MaxCharacters>
<Mnemonic></Mnemonic>
<Position>0</Position>
<ReferenceWeight>keine</ReferenceWeight>
<RessourceIdentifier></RessourceIdentifier>
<ToolTipText></ToolTipText>
</Editordescriptor>
<ForeignKey>false</ForeignKey>
<Global>false</Global>
<GlobalId>false</GlobalId>
<HideReference>false</HideReference>
<History>@changed OLI - Added.</History>
<IndexSearchMember>false</IndexSearchMember>
<Indexed>false</Indexed>
<IndividualDefaultValue></IndividualDefaultValue>
<Kodiert>false</Kodiert>
<Kommentar></Kommentar>
<Konsistenz>
<Writeablemember>false</Writeablemember>
</Konsistenz>
<LastModificationField>false</LastModificationField>
<ListItemField>false</ListItemField>
<Name>RecommendedRetailPrice</Name>
<NotNull>false</NotNull>
<PanelNumber>0</PanelNumber>
<Parameter></Parameter>
<PrimaryKey>false</PrimaryKey>
<RemovedStateField>false</RemovedStateField>
<SequenceForKeyGeneration></SequenceForKeyGeneration>
<SuppressForeignKeyConstraints>false</SuppressForeignKeyConstraints>
<TechnicalField>false</TechnicalField>
<Transient>false</Transient>
<Unique>false</Unique>
</Spalte4>
<Spalte5>
<AlterInBatch>false</AlterInBatch>
<Aufgehoben>false</Aufgehoben>
<CanBeReferenced>false</CanBeReferenced>
<Disabled>false</Disabled>
<Domain>Name</Domain>
<Editordescriptor>
<Editormember>false</Editormember>
<LabelText></LabelText>
<MaxCharacters>0</MaxCharacters>
<Mnemonic></Mnemonic>
<Position>0</Position>
<ReferenceWeight>keine</ReferenceWeight>
<RessourceIdentifier></RessourceIdentifier>
<ToolTipText></ToolTipText>
</Editordescriptor>
<ForeignKey>false</ForeignKey>
<Global>false</Global>
<GlobalId>false</GlobalId>
<HideReference>false</HideReference>
<History>@changed OLI - Added.</History>
<IndexSearchMember>false</IndexSearchMember>
<Indexed>false</Indexed>
<IndividualDefaultValue></IndividualDefaultValue>
<Kodiert>false</Kodiert>
<Kommentar></Kommentar>
<Konsistenz>
<Writeablemember>false</Writeablemember>
</Konsistenz>
<LastModificationField>false</LastModificationField>
<ListItemField>false</ListItemField>
<Name>Title</Name>
<NotNull>false</NotNull>
<PanelNumber>0</PanelNumber>
<Parameter></Parameter>
<PrimaryKey>false</PrimaryKey>
<RemovedStateField>false</RemovedStateField>
<SequenceForKeyGeneration></SequenceForKeyGeneration>
<SuppressForeignKeyConstraints>false</SuppressForeignKeyConstraints>
<TechnicalField>false</TechnicalField>
<Transient>false</Transient>
<Unique>false</Unique>
</Spalte5>
</Spalten>
<Stereotype>
<Anzahl>0</Anzahl>
</Stereotype>
<Views>
<Anzahl>1</Anzahl>
<View0>
<Name>Main</Name>
<X>250</X>
<Y>125</Y>
</View0>
</Views>
</Tabelle0>
<Tabelle1>
<Aufgehoben>false</Aufgehoben>
<Codegenerator>
<AuswahlMembers>
<Anzahl>0</Anzahl>
</AuswahlMembers>
<CompareMembers>
<Anzahl>0</Anzahl>
</CompareMembers>
<Equalsmembers>
<Anzahl>0</Anzahl>
</Equalsmembers>
<HashCodeMembers>
<Anzahl>0</Anzahl>
</HashCodeMembers>
<NReferenzen>
<Anzahl>0</Anzahl>
</NReferenzen>
<OrderMembers>
<Anzahl>0</Anzahl>
</OrderMembers>
<ToComboStringMembers>
<Anzahl>0</Anzahl>
</ToComboStringMembers>
<ToStringMembers>
<Anzahl>0</Anzahl>
</ToStringMembers>
</Codegenerator>
<ExternalTable>false</ExternalTable>
<Farben>
<Hintergrund>wei&szlig;</Hintergrund>
<Schrift>schwarz</Schrift>
</Farben>
<FirstGenerationDone>false</FirstGenerationDone>
<History>@changed OLI - Added.$BR$@changed OLI - Added column: Id.</History>
<InDevelopment>false</InDevelopment>
<Kommentar></Kommentar>
<NMRelation>false</NMRelation>
<Name>Author</Name>
<Options>
<Count>0</Count>
</Options>
<Panels>
<Anzahl>1</Anzahl>
<Panel0>
<PanelClass></PanelClass>
<PanelNumber>0</PanelNumber>
<TabMnemonic>1</TabMnemonic>
<TabTitle>1.Daten</TabTitle>
<TabToolTipText>Hier können Sie die Daten des Objekt warten</TabToolTipText>
</Panel0>
</Panels>
<Spalten>
<Anzahl>4</Anzahl>
<Codegenerator>
<ActiveInApplication>false</ActiveInApplication>
<AdditionalCreateConstraints></AdditionalCreateConstraints>
<Codegeneratoroptionen></Codegeneratoroptionen>
<Codeverzeichnis>.</Codeverzeichnis>
<Codieren>true</Codieren>
<DynamicCode>true</DynamicCode>
<Inherited>false</Inherited>
<Kontextname></Kontextname>
<UniqueFormula></UniqueFormula>
</Codegenerator>
<Spalte0>
<AlterInBatch>false</AlterInBatch>
<Aufgehoben>false</Aufgehoben>
<CanBeReferenced>true</CanBeReferenced>
<Disabled>false</Disabled>
<Domain>Ident</Domain>
<Editordescriptor>
<Editormember>false</Editormember>
<LabelText></LabelText>
<MaxCharacters>0</MaxCharacters>
<Mnemonic></Mnemonic>
<Position>0</Position>
<ReferenceWeight>keine</ReferenceWeight>
<RessourceIdentifier></RessourceIdentifier>
<ToolTipText></ToolTipText>
</Editordescriptor>
<ForeignKey>false</ForeignKey>
<Global>false</Global>
<GlobalId>false</GlobalId>
<HideReference>false</HideReference>
<History>@changed OLI - Added.</History>
<IndexSearchMember>false</IndexSearchMember>
<Indexed>false</Indexed>
<IndividualDefaultValue></IndividualDefaultValue>
<Kodiert>false</Kodiert>
<Kommentar></Kommentar>
<Konsistenz>
<Writeablemember>false</Writeablemember>
</Konsistenz>
<LastModificationField>false</LastModificationField>
<ListItemField>false</ListItemField>
<Name>Author</Name>
<NotNull>false</NotNull>
<PanelNumber>0</PanelNumber>
<Parameter></Parameter>
<PrimaryKey>true</PrimaryKey>
<RemovedStateField>false</RemovedStateField>
<SequenceForKeyGeneration></SequenceForKeyGeneration>
<SuppressForeignKeyConstraints>false</SuppressForeignKeyConstraints>
<TechnicalField>false</TechnicalField>
<Transient>false</Transient>
<Unique>false</Unique>
</Spalte0>
<Spalte1>
<AlterInBatch>false</AlterInBatch>
<Aufgehoben>false</Aufgehoben>
<CanBeReferenced>false</CanBeReferenced>
<Disabled>false</Disabled>
<Domain>Name</Domain>
<Editordescriptor>
<Editormember>false</Editormember>
<LabelText></LabelText>
<MaxCharacters>0</MaxCharacters>
<Mnemonic></Mnemonic>
<Position>0</Position>
<ReferenceWeight>keine</ReferenceWeight>
<RessourceIdentifier></RessourceIdentifier>
<ToolTipText></ToolTipText>
</Editordescriptor>
<ForeignKey>false</ForeignKey>
<Global>false</Global>
<GlobalId>false</GlobalId>
<HideReference>false</HideReference>
<History>@changed OLI - Added.</History>
<IndexSearchMember>false</IndexSearchMember>
<Indexed>false</Indexed>
<IndividualDefaultValue></IndividualDefaultValue>
<Kodiert>false</Kodiert>
<Kommentar></Kommentar>
<Konsistenz>
<Writeablemember>false</Writeablemember>
</Konsistenz>
<LastModificationField>false</LastModificationField>
<ListItemField>false</ListItemField>
<Name>Address</Name>
<NotNull>true</NotNull>
<PanelNumber>0</PanelNumber>
<Parameter></Parameter>
<PrimaryKey>false</PrimaryKey>
<RemovedStateField>false</RemovedStateField>
<SequenceForKeyGeneration></SequenceForKeyGeneration>
<SuppressForeignKeyConstraints>false</SuppressForeignKeyConstraints>
<TechnicalField>false</TechnicalField>
<Transient>false</Transient>
<Unique>false</Unique>
</Spalte1>
<Spalte2>
<AlterInBatch>false</AlterInBatch>
<Aufgehoben>false</Aufgehoben>
<CanBeReferenced>false</CanBeReferenced>
<Disabled>false</Disabled>
<Domain>Ident</Domain>
<Editordescriptor>
<Editormember>false</Editormember>
<LabelText></LabelText>
<MaxCharacters>0</MaxCharacters>
<Mnemonic></Mnemonic>
<Position>0</Position>
<ReferenceWeight>keine</ReferenceWeight>
<RessourceIdentifier></RessourceIdentifier>
<ToolTipText></ToolTipText>
</Editordescriptor>
<ForeignKey>false</ForeignKey>
<Global>false</Global>
<GlobalId>false</GlobalId>
<HideReference>false</HideReference>
<History>@changed OLI - Added.</History>
<IndexSearchMember>false</IndexSearchMember>
<Indexed>false</Indexed>
<IndividualDefaultValue></IndividualDefaultValue>
<Kodiert>false</Kodiert>
<Kommentar></Kommentar>
<Konsistenz>
<Writeablemember>false</Writeablemember>
</Konsistenz>
<LastModificationField>false</LastModificationField>
<ListItemField>false</ListItemField>
<Name>AuthorId</Name>
<NotNull>false</NotNull>
<PanelNumber>0</PanelNumber>
<Parameter></Parameter>
<PrimaryKey>false</PrimaryKey>
<RemovedStateField>false</RemovedStateField>
<SequenceForKeyGeneration></SequenceForKeyGeneration>
<SuppressForeignKeyConstraints>false</SuppressForeignKeyConstraints>
<TechnicalField>false</TechnicalField>
<Transient>false</Transient>
<Unique>true</Unique>
</Spalte2>
<Spalte3>
<AlterInBatch>false</AlterInBatch>
<Aufgehoben>false</Aufgehoben>
<CanBeReferenced>false</CanBeReferenced>
<Disabled>false</Disabled>
<Domain>Name</Domain>
<Editordescriptor>
<Editormember>false</Editormember>
<LabelText></LabelText>
<MaxCharacters>0</MaxCharacters>
<Mnemonic></Mnemonic>
<Position>0</Position>
<ReferenceWeight>keine</ReferenceWeight>
<RessourceIdentifier></RessourceIdentifier>
<ToolTipText></ToolTipText>
</Editordescriptor>
<ForeignKey>false</ForeignKey>
<Global>false</Global>
<GlobalId>false</GlobalId>
<HideReference>false</HideReference>
<History>@changed OLI - Added.</History>
<IndexSearchMember>false</IndexSearchMember>
<Indexed>false</Indexed>
<IndividualDefaultValue></IndividualDefaultValue>
<Kodiert>false</Kodiert>
<Kommentar></Kommentar>
<Konsistenz>
<Writeablemember>false</Writeablemember>
</Konsistenz>
<LastModificationField>false</LastModificationField>
<ListItemField>false</ListItemField>
<Name>Name</Name>
<NotNull>true</NotNull>
<PanelNumber>0</PanelNumber>
<Parameter></Parameter>
<PrimaryKey>false</PrimaryKey>
<RemovedStateField>false</RemovedStateField>
<SequenceForKeyGeneration></SequenceForKeyGeneration>
<SuppressForeignKeyConstraints>false</SuppressForeignKeyConstraints>
<TechnicalField>false</TechnicalField>
<Transient>false</Transient>
<Unique>false</Unique>
</Spalte3>
</Spalten>
<Stereotype>
<Anzahl>0</Anzahl>
</Stereotype>
<Views>
<Anzahl>1</Anzahl>
<View0>
<Name>Main</Name>
<X>575</X>
<Y>125</Y>
</View0>
</Views>
</Tabelle1>
<Tabelle2>
<Aufgehoben>false</Aufgehoben>
<Codegenerator>
<AuswahlMembers>
<Anzahl>0</Anzahl>
</AuswahlMembers>
<CompareMembers>
<Anzahl>0</Anzahl>
</CompareMembers>
<Equalsmembers>
<Anzahl>0</Anzahl>
</Equalsmembers>
<HashCodeMembers>
<Anzahl>0</Anzahl>
</HashCodeMembers>
<NReferenzen>
<Anzahl>0</Anzahl>
</NReferenzen>
<OrderMembers>
<Anzahl>0</Anzahl>
</OrderMembers>
<ToComboStringMembers>
<Anzahl>0</Anzahl>
</ToComboStringMembers>
<ToStringMembers>
<Anzahl>0</Anzahl>
</ToStringMembers>
</Codegenerator>
<ExternalTable>false</ExternalTable>
<Farben>
<Hintergrund>wei&szlig;</Hintergrund>
<Schrift>schwarz</Schrift>
</Farben>
<FirstGenerationDone>false</FirstGenerationDone>
<History>@changed OLI - Added.</History>
<InDevelopment>false</InDevelopment>
<Kommentar></Kommentar>
<NMRelation>false</NMRelation>
<Name>Publisher</Name>
<Options>
<Count>0</Count>
</Options>
<Panels>
<Anzahl>1</Anzahl>
<Panel0>
<PanelClass></PanelClass>
<PanelNumber>0</PanelNumber>
<TabMnemonic>1</TabMnemonic>
<TabTitle>1.Daten</TabTitle>
<TabToolTipText>Hier können Sie die Daten des Objekt warten</TabToolTipText>
</Panel0>
</Panels>
<Spalten>
<Anzahl>2</Anzahl>
<Codegenerator>
<ActiveInApplication>false</ActiveInApplication>
<AdditionalCreateConstraints></AdditionalCreateConstraints>
<Codegeneratoroptionen></Codegeneratoroptionen>
<Codeverzeichnis>.</Codeverzeichnis>
<Codieren>true</Codieren>
<DynamicCode>true</DynamicCode>
<Inherited>false</Inherited>
<Kontextname></Kontextname>
<UniqueFormula></UniqueFormula>
</Codegenerator>
<Spalte0>
<AlterInBatch>false</AlterInBatch>
<Aufgehoben>false</Aufgehoben>
<CanBeReferenced>true</CanBeReferenced>
<Disabled>false</Disabled>
<Domain>Ident</Domain>
<Editordescriptor>
<Editormember>false</Editormember>
<LabelText></LabelText>
<MaxCharacters>0</MaxCharacters>
<Mnemonic></Mnemonic>
<Position>0</Position>
<ReferenceWeight>keine</ReferenceWeight>
<RessourceIdentifier></RessourceIdentifier>
<ToolTipText></ToolTipText>
</Editordescriptor>
<ForeignKey>false</ForeignKey>
<Global>false</Global>
<GlobalId>false</GlobalId>
<HideReference>false</HideReference>
<History>@changed OLI - Added.</History>
<IndexSearchMember>false</IndexSearchMember>
<Indexed>false</Indexed>
<IndividualDefaultValue></IndividualDefaultValue>
<Kodiert>false</Kodiert>
<Kommentar></Kommentar>
<Konsistenz>
<Writeablemember>false</Writeablemember>
</Konsistenz>
<LastModificationField>false</LastModificationField>
<ListItemField>false</ListItemField>
<Name>Id</Name>
<NotNull>false</NotNull>
<PanelNumber>0</PanelNumber>
<Parameter></Parameter>
<PrimaryKey>true</PrimaryKey>
<RemovedStateField>false</RemovedStateField>
<SequenceForKeyGeneration></SequenceForKeyGeneration>
<SuppressForeignKeyConstraints>false</SuppressForeignKeyConstraints>
<TechnicalField>false</TechnicalField>
<Transient>false</Transient>
<Unique>false</Unique>
</Spalte0>
<Spalte1>
<AlterInBatch>false</AlterInBatch>
<Aufgehoben>false</Aufgehoben>
<CanBeReferenced>false</CanBeReferenced>
<Disabled>false</Disabled>
<Domain>LongName</Domain>
<Editordescriptor>
<Editormember>false</Editormember>
<LabelText></LabelText>
<MaxCharacters>0</MaxCharacters>
<Mnemonic></Mnemonic>
<Position>0</Position>
<ReferenceWeight>keine</ReferenceWeight>
<RessourceIdentifier></RessourceIdentifier>
<ToolTipText></ToolTipText>
</Editordescriptor>
<ForeignKey>false</ForeignKey>
<Global>false</Global>
<GlobalId>false</GlobalId>
<HideReference>false</HideReference>
<History>@changed OLI - Added.</History>
<IndexSearchMember>false</IndexSearchMember>
<Indexed>true</Indexed>
<IndividualDefaultValue>'Penguin'</IndividualDefaultValue>
<Kodiert>false</Kodiert>
<Kommentar></Kommentar>
<Konsistenz>
<Writeablemember>false</Writeablemember>
</Konsistenz>
<LastModificationField>false</LastModificationField>
<ListItemField>false</ListItemField>
<Name>Name</Name>
<NotNull>false</NotNull>
<PanelNumber>0</PanelNumber>
<Parameter></Parameter>
<PrimaryKey>false</PrimaryKey>
<RemovedStateField>false</RemovedStateField>
<SequenceForKeyGeneration></SequenceForKeyGeneration>
<SuppressForeignKeyConstraints>false</SuppressForeignKeyConstraints>
<TechnicalField>false</TechnicalField>
<Transient>false</Transient>
<Unique>true</Unique>
</Spalte1>
</Spalten>
<Stereotype>
<Anzahl>0</Anzahl>
</Stereotype>
<Views>
<Anzahl>1</Anzahl>
<View0>
<Name>Main</Name>
<X>250</X>
<Y>375</Y>
</View0>
</Views>
</Tabelle2>
<Tabelle3>
<Aufgehoben>false</Aufgehoben>
<Codegenerator>
<AuswahlMembers>
<Anzahl>0</Anzahl>
</AuswahlMembers>
<CompareMembers>
<Anzahl>0</Anzahl>
</CompareMembers>
<Equalsmembers>
<Anzahl>0</Anzahl>
</Equalsmembers>
<HashCodeMembers>
<Anzahl>0</Anzahl>
</HashCodeMembers>
<NReferenzen>
<Anzahl>0</Anzahl>
</NReferenzen>
<OrderMembers>
<Anzahl>0</Anzahl>
</OrderMembers>
<ToComboStringMembers>
<Anzahl>0</Anzahl>
</ToComboStringMembers>
<ToStringMembers>
<Anzahl>0</Anzahl>
</ToStringMembers>
</Codegenerator>
<ExternalTable>false</ExternalTable>
<Farben>
<Hintergrund>wei&szlig;</Hintergrund>
<Schrift>schwarz</Schrift>
</Farben>
<FirstGenerationDone>false</FirstGenerationDone>
<History>@changed OLI - Added.</History>
<InDevelopment>false</InDevelopment>
<Kommentar></Kommentar>
<NMRelation>true</NMRelation>
<Name>AuthorPublisher</Name>
<Options>
<Count>0</Count>
</Options>
<Panels>
<Anzahl>1</Anzahl>
<Panel0>
<PanelClass></PanelClass>
<PanelNumber>0</PanelNumber>
<TabMnemonic>1</TabMnemonic>
<TabTitle>1.Daten</TabTitle>
<TabToolTipText>Hier können Sie die Daten des Objekt warten</TabToolTipText>
</Panel0>
</Panels>
<Spalten>
<Anzahl>2</Anzahl>
<Codegenerator>
<ActiveInApplication>false</ActiveInApplication>
<AdditionalCreateConstraints></AdditionalCreateConstraints>
<Codegeneratoroptionen></Codegeneratoroptionen>
<Codeverzeichnis>.</Codeverzeichnis>
<Codieren>true</Codieren>
<DynamicCode>true</DynamicCode>
<Inherited>false</Inherited>
<Kontextname></Kontextname>
<UniqueFormula></UniqueFormula>
</Codegenerator>
<Spalte0>
<AlterInBatch>false</AlterInBatch>
<Aufgehoben>false</Aufgehoben>
<CanBeReferenced>true</CanBeReferenced>
<Disabled>false</Disabled>
<Domain>Ident</Domain>
<Editordescriptor>
<Editormember>false</Editormember>
<LabelText></LabelText>
<MaxCharacters>0</MaxCharacters>
<Mnemonic></Mnemonic>
<Position>0</Position>
<ReferenceWeight>keine</ReferenceWeight>
<RessourceIdentifier></RessourceIdentifier>
<ToolTipText></ToolTipText>
</Editordescriptor>
<ForeignKey>true</ForeignKey>
<Global>false</Global>
<GlobalId>false</GlobalId>
<HideReference>false</HideReference>
<History>@changed OLI - Added.</History>
<IndexSearchMember>false</IndexSearchMember>
<Indexed>false</Indexed>
<IndividualDefaultValue></IndividualDefaultValue>
<Kodiert>false</Kodiert>
<Kommentar></Kommentar>
<Konsistenz>
<Writeablemember>false</Writeablemember>
</Konsistenz>
<LastModificationField>false</LastModificationField>
<ListItemField>false</ListItemField>
<Name>Author</Name>
<NotNull>true</NotNull>
<PanelNumber>0</PanelNumber>
<Parameter></Parameter>
<PrimaryKey>true</PrimaryKey>
<Referenz>
<Direction0>UP</Direction0>
<Direction1>DOWN</Direction1>
<Offset0>25</Offset0>
<Offset1>25</Offset1>
<Spalte>Author</Spalte>
<Tabelle>Author</Tabelle>
<Views>
<Anzahl>1</Anzahl>
<View0>
<Direction0>UP</Direction0>
<Direction1>DOWN</Direction1>
<Name>Main</Name>
<Offset0>25</Offset0>
<Offset1>25</Offset1>
<Points>
<Anzahl>0</Anzahl>
</Points>
</View0>
</Views>
</Referenz>
<RemovedStateField>false</RemovedStateField>
<SequenceForKeyGeneration></SequenceForKeyGeneration>
<SuppressForeignKeyConstraints>false</SuppressForeignKeyConstraints>
<TechnicalField>false</TechnicalField>
<Transient>false</Transient>
<Unique>false</Unique>
</Spalte0>
<Spalte1>
<AlterInBatch>false</AlterInBatch>
<Aufgehoben>false</Aufgehoben>
<CanBeReferenced>true</CanBeReferenced>
<Disabled>false</Disabled>
<Domain>Ident</Domain>
<Editordescriptor>
<Editormember>false</Editormember>
<LabelText></LabelText>
<MaxCharacters>0</MaxCharacters>
<Mnemonic></Mnemonic>
<Position>0</Position>
<ReferenceWeight>keine</ReferenceWeight>
<RessourceIdentifier></RessourceIdentifier>
<ToolTipText></ToolTipText>
</Editordescriptor>
<ForeignKey>true</ForeignKey>
<Global>false</Global>
<GlobalId>false</GlobalId>
<HideReference>false</HideReference>
<History>@changed OLI - Added.</History>
<IndexSearchMember>false</IndexSearchMember>
<Indexed>false</Indexed>
<IndividualDefaultValue></IndividualDefaultValue>
<Kodiert>false</Kodiert>
<Kommentar></Kommentar>
<Konsistenz>
<Writeablemember>false</Writeablemember>
</Konsistenz>
<LastModificationField>false</LastModificationField>
<ListItemField>false</ListItemField>
<Name>Publisher</Name>
<NotNull>true</NotNull>
<PanelNumber>0</PanelNumber>
<Parameter></Parameter>
<PrimaryKey>true</PrimaryKey>
<Referenz>
<Direction0>LEFT</Direction0>
<Direction1>RIGHT</Direction1>
<Offset0>25</Offset0>
<Offset1>25</Offset1>
<Spalte>Id</Spalte>
<Tabelle>Publisher</Tabelle>
<Views>
<Anzahl>1</Anzahl>
<View0>
<Direction0>LEFT</Direction0>
<Direction1>RIGHT</Direction1>
<Name>Main</Name>
<Offset0>25</Offset0>
<Offset1>25</Offset1>
<Points>
<Anzahl>0</Anzahl>
</Points>
</View0>
</Views>
</Referenz>
<RemovedStateField>false</RemovedStateField>
<SequenceForKeyGeneration></SequenceForKeyGeneration>
<SuppressForeignKeyConstraints>false</SuppressForeignKeyConstraints>
<TechnicalField>false</TechnicalField>
<Transient>false</Transient>
<Unique>false</Unique>
</Spalte1>
</Spalten>
<Stereotype>
<Anzahl>0</Anzahl>
</Stereotype>
<Views>
<Anzahl>1</Anzahl>
<View0>
<Name>Main</Name>
<X>575</X>
<Y>375</Y>
</View0>
</Views>
</Tabelle3>
<Tabelle4>
<Aufgehoben>false</Aufgehoben>
<Codegenerator>
<AuswahlMembers>
<Anzahl>0</Anzahl>
</AuswahlMembers>
<CompareMembers>
<Anzahl>0</Anzahl>
</CompareMembers>
<Equalsmembers>
<Anzahl>0</Anzahl>
</Equalsmembers>
<HashCodeMembers>
<Anzahl>0</Anzahl>
</HashCodeMembers>
<NReferenzen>
<Anzahl>0</Anzahl>
</NReferenzen>
<OrderMembers>
<Anzahl>0</Anzahl>
</OrderMembers>
<ToComboStringMembers>
<Anzahl>0</Anzahl>
</ToComboStringMembers>
<ToStringMembers>
<Anzahl>0</Anzahl>
</ToStringMembers>
</Codegenerator>
<ExternalTable>false</ExternalTable>
<Farben>
<Hintergrund>wei&szlig;</Hintergrund>
<Schrift>schwarz</Schrift>
</Farben>
<FirstGenerationDone>false</FirstGenerationDone>
<History>@changed OLI - Added.</History>
<InDevelopment>false</InDevelopment>
<Kommentar></Kommentar>
<NMRelation>false</NMRelation>
<Name>TestTable</Name>
<Options>
<Count>0</Count>
</Options>
<Panels>
<Anzahl>1</Anzahl>
<Panel0>
<PanelClass></PanelClass>
<PanelNumber>0</PanelNumber>
<TabMnemonic>1</TabMnemonic>
<TabTitle>1.Daten</TabTitle>
<TabToolTipText>Hier können Sie die Daten des Objekt warten</TabToolTipText>
</Panel0>
</Panels>
<Spalten>
<Anzahl>2</Anzahl>
<Codegenerator>
<ActiveInApplication>false</ActiveInApplication>
<AdditionalCreateConstraints></AdditionalCreateConstraints>
<Codegeneratoroptionen></Codegeneratoroptionen>
<Codeverzeichnis>.</Codeverzeichnis>
<Codieren>true</Codieren>
<DynamicCode>true</DynamicCode>
<Inherited>false</Inherited>
<Kontextname></Kontextname>
<UniqueFormula></UniqueFormula>
</Codegenerator>
<Spalte0>
<AlterInBatch>false</AlterInBatch>
<Aufgehoben>false</Aufgehoben>
<CanBeReferenced>true</CanBeReferenced>
<Disabled>false</Disabled>
<Domain>Ident</Domain>
<Editordescriptor>
<Editormember>false</Editormember>
<LabelText></LabelText>
<MaxCharacters>0</MaxCharacters>
<Mnemonic></Mnemonic>
<Position>0</Position>
<ReferenceWeight>keine</ReferenceWeight>
<RessourceIdentifier></RessourceIdentifier>
<ToolTipText></ToolTipText>
</Editordescriptor>
<ForeignKey>false</ForeignKey>
<Global>false</Global>
<GlobalId>false</GlobalId>
<HideReference>false</HideReference>
<History>@changed OLI - Added.</History>
<IndexSearchMember>false</IndexSearchMember>
<Indexed>false</Indexed>
<IndividualDefaultValue></IndividualDefaultValue>
<Kodiert>false</Kodiert>
<Kommentar></Kommentar>
<Konsistenz>
<Writeablemember>false</Writeablemember>
</Konsistenz>
<LastModificationField>false</LastModificationField>
<ListItemField>false</ListItemField>
<Name>Id</Name>
<NotNull>false</NotNull>
<PanelNumber>0</PanelNumber>
<Parameter></Parameter>
<PrimaryKey>true</PrimaryKey>
<RemovedStateField>false</RemovedStateField>
<SequenceForKeyGeneration></SequenceForKeyGeneration>
<SuppressForeignKeyConstraints>false</SuppressForeignKeyConstraints>
<TechnicalField>false</TechnicalField>
<Transient>false</Transient>
<Unique>false</Unique>
</Spalte0>
<Spalte1>
<AlterInBatch>false</AlterInBatch>
<Aufgehoben>false</Aufgehoben>
<CanBeReferenced>false</CanBeReferenced>
<Disabled>false</Disabled>
<Domain>Ident</Domain>
<Editordescriptor>
<Editormember>false</Editormember>
<LabelText></LabelText>
<MaxCharacters>0</MaxCharacters>
<Mnemonic></Mnemonic>
<Position>0</Position>
<ReferenceWeight>keine</ReferenceWeight>
<RessourceIdentifier></RessourceIdentifier>
<ToolTipText></ToolTipText>
</Editordescriptor>
<ForeignKey>true</ForeignKey>
<Global>false</Global>
<GlobalId>false</GlobalId>
<HideReference>false</HideReference>
<History>@changed OLI - Added.</History>
<IndexSearchMember>false</IndexSearchMember>
<Indexed>false</Indexed>
<IndividualDefaultValue></IndividualDefaultValue>
<Kodiert>false</Kodiert>
<Kommentar></Kommentar>
<Konsistenz>
<Writeablemember>false</Writeablemember>
</Konsistenz>
<LastModificationField>false</LastModificationField>
<ListItemField>false</ListItemField>
<Name>Publisher</Name>
<NotNull>false</NotNull>
<PanelNumber>0</PanelNumber>
<Parameter></Parameter>
<PrimaryKey>false</PrimaryKey>
<Referenz>
<Direction0>UP</Direction0>
<Direction1>DOWN</Direction1>
<Offset0>25</Offset0>
<Offset1>25</Offset1>
<Spalte>Id</Spalte>
<Tabelle>Publisher</Tabelle>
<Views>
<Anzahl>1</Anzahl>
<View0>
<Direction0>UP</Direction0>
<Direction1>DOWN</Direction1>
<Name>Main</Name>
<Offset0>25</Offset0>
<Offset1>25</Offset1>
<Points>
<Anzahl>0</Anzahl>
</Points>
</View0>
</Views>
</Referenz>
<RemovedStateField>false</RemovedStateField>
<SequenceForKeyGeneration></SequenceForKeyGeneration>
<SuppressForeignKeyConstraints>false</SuppressForeignKeyConstraints>
<TechnicalField>false</TechnicalField>
<Transient>false</Transient>
<Unique>false</Unique>
</Spalte1>
</Spalten>
<Stereotype>
<Anzahl>0</Anzahl>
</Stereotype>
<Views>
<Anzahl>1</Anzahl>
<View0>
<Name>Main</Name>
<X>250</X>
<Y>525</Y>
</View0>
</Views>
</Tabelle4>
</Tabellen>
<Views>
<Anzahl>1</Anzahl>
<View0>
<Beschreibung>Diese Sicht beinhaltet alle Tabellen des Schemas</Beschreibung>
<Name>Main</Name>
<ReferenzierteSpaltenAnzeigen>true</ReferenzierteSpaltenAnzeigen>
<Tabelle0>Book</Tabelle0>
<Tabelle1>Author</Tabelle1>
<Tabelle2>Publisher</Tabelle2>
<Tabelle3>AuthorPublisher</Tabelle3>
<Tabelle4>TestTable</Tabelle4>
<Tabellenanzahl>5</Tabellenanzahl>
<TechnischeSpaltenVerstecken>false</TechnischeSpaltenVerstecken>
</View0>
</Views>
</Diagramm>
|
AdaCore/gpr | Ada | 66 | ads | private
package Hi.Printer is
procedure Put;
end Hi.Printer;
|
AdaCore/Ada_Drivers_Library | Ada | 21,742 | ads | -- This spec has been automatically generated from STM32F7x9.svd
pragma Restrictions (No_Elaboration_Code);
pragma Ada_2012;
pragma Style_Checks (Off);
with HAL;
with System;
package STM32_SVD.USART is
pragma Preelaborate;
---------------
-- Registers --
---------------
-- CR1_DEDT array
type CR1_DEDT_Field_Array is array (0 .. 4) of Boolean
with Component_Size => 1, Size => 5;
-- Type definition for CR1_DEDT
type CR1_DEDT_Field
(As_Array : Boolean := False)
is record
case As_Array is
when False =>
-- DEDT as a value
Val : HAL.UInt5;
when True =>
-- DEDT as an array
Arr : CR1_DEDT_Field_Array;
end case;
end record
with Unchecked_Union, Size => 5;
for CR1_DEDT_Field use record
Val at 0 range 0 .. 4;
Arr at 0 range 0 .. 4;
end record;
-- CR1_DEAT array
type CR1_DEAT_Field_Array is array (0 .. 4) of Boolean
with Component_Size => 1, Size => 5;
-- Type definition for CR1_DEAT
type CR1_DEAT_Field
(As_Array : Boolean := False)
is record
case As_Array is
when False =>
-- DEAT as a value
Val : HAL.UInt5;
when True =>
-- DEAT as an array
Arr : CR1_DEAT_Field_Array;
end case;
end record
with Unchecked_Union, Size => 5;
for CR1_DEAT_Field use record
Val at 0 range 0 .. 4;
Arr at 0 range 0 .. 4;
end record;
-- Control register 1
type CR1_Register is record
-- USART enable
UE : Boolean := False;
-- USART enable in Stop mode
UESM : Boolean := False;
-- Receiver enable
RE : Boolean := False;
-- Transmitter enable
TE : Boolean := False;
-- IDLE interrupt enable
IDLEIE : Boolean := False;
-- RXNE interrupt enable
RXNEIE : Boolean := False;
-- Transmission complete interrupt enable
TCIE : Boolean := False;
-- interrupt enable
TXEIE : Boolean := False;
-- PE interrupt enable
PEIE : Boolean := False;
-- Parity selection
PS : Boolean := False;
-- Parity control enable
PCE : Boolean := False;
-- Receiver wakeup method
WAKE : Boolean := False;
-- Word length
M0 : Boolean := False;
-- Mute mode enable
MME : Boolean := False;
-- Character match interrupt enable
CMIE : Boolean := False;
-- Oversampling mode
OVER8 : Boolean := False;
-- DEDT0
DEDT : CR1_DEDT_Field := (As_Array => False, Val => 16#0#);
-- DEAT0
DEAT : CR1_DEAT_Field := (As_Array => False, Val => 16#0#);
-- Receiver timeout interrupt enable
RTOIE : Boolean := False;
-- End of Block interrupt enable
EOBIE : Boolean := False;
-- Word length
M1 : Boolean := False;
-- unspecified
Reserved_29_31 : HAL.UInt3 := 16#0#;
end record
with Volatile_Full_Access, Size => 32,
Bit_Order => System.Low_Order_First;
for CR1_Register use record
UE at 0 range 0 .. 0;
UESM at 0 range 1 .. 1;
RE at 0 range 2 .. 2;
TE at 0 range 3 .. 3;
IDLEIE at 0 range 4 .. 4;
RXNEIE at 0 range 5 .. 5;
TCIE at 0 range 6 .. 6;
TXEIE at 0 range 7 .. 7;
PEIE at 0 range 8 .. 8;
PS at 0 range 9 .. 9;
PCE at 0 range 10 .. 10;
WAKE at 0 range 11 .. 11;
M0 at 0 range 12 .. 12;
MME at 0 range 13 .. 13;
CMIE at 0 range 14 .. 14;
OVER8 at 0 range 15 .. 15;
DEDT at 0 range 16 .. 20;
DEAT at 0 range 21 .. 25;
RTOIE at 0 range 26 .. 26;
EOBIE at 0 range 27 .. 27;
M1 at 0 range 28 .. 28;
Reserved_29_31 at 0 range 29 .. 31;
end record;
subtype CR2_STOP_Field is HAL.UInt2;
-- CR2_ABRMOD array
type CR2_ABRMOD_Field_Array is array (0 .. 1) of Boolean
with Component_Size => 1, Size => 2;
-- Type definition for CR2_ABRMOD
type CR2_ABRMOD_Field
(As_Array : Boolean := False)
is record
case As_Array is
when False =>
-- ABRMOD as a value
Val : HAL.UInt2;
when True =>
-- ABRMOD as an array
Arr : CR2_ABRMOD_Field_Array;
end case;
end record
with Unchecked_Union, Size => 2;
for CR2_ABRMOD_Field use record
Val at 0 range 0 .. 1;
Arr at 0 range 0 .. 1;
end record;
subtype CR2_ADD0_3_Field is HAL.UInt4;
subtype CR2_ADD4_7_Field is HAL.UInt4;
-- Control register 2
type CR2_Register is record
-- unspecified
Reserved_0_3 : HAL.UInt4 := 16#0#;
-- 7-bit Address Detection/4-bit Address Detection
ADDM7 : Boolean := False;
-- LIN break detection length
LBDL : Boolean := False;
-- LIN break detection interrupt enable
LBDIE : Boolean := False;
-- unspecified
Reserved_7_7 : HAL.Bit := 16#0#;
-- Last bit clock pulse
LBCL : Boolean := False;
-- Clock phase
CPHA : Boolean := False;
-- Clock polarity
CPOL : Boolean := False;
-- Clock enable
CLKEN : Boolean := False;
-- STOP bits
STOP : CR2_STOP_Field := 16#0#;
-- LIN mode enable
LINEN : Boolean := False;
-- Swap TX/RX pins
SWAP : Boolean := False;
-- RX pin active level inversion
RXINV : Boolean := False;
-- TX pin active level inversion
TXINV : Boolean := False;
-- Binary data inversion
TAINV : Boolean := False;
-- Most significant bit first
MSBFIRST : Boolean := False;
-- Auto baud rate enable
ABREN : Boolean := False;
-- ABRMOD0
ABRMOD : CR2_ABRMOD_Field := (As_Array => False, Val => 16#0#);
-- Receiver timeout enable
RTOEN : Boolean := False;
-- Address of the USART node
ADD0_3 : CR2_ADD0_3_Field := 16#0#;
-- Address of the USART node
ADD4_7 : CR2_ADD4_7_Field := 16#0#;
end record
with Volatile_Full_Access, Size => 32,
Bit_Order => System.Low_Order_First;
for CR2_Register use record
Reserved_0_3 at 0 range 0 .. 3;
ADDM7 at 0 range 4 .. 4;
LBDL at 0 range 5 .. 5;
LBDIE at 0 range 6 .. 6;
Reserved_7_7 at 0 range 7 .. 7;
LBCL at 0 range 8 .. 8;
CPHA at 0 range 9 .. 9;
CPOL at 0 range 10 .. 10;
CLKEN at 0 range 11 .. 11;
STOP at 0 range 12 .. 13;
LINEN at 0 range 14 .. 14;
SWAP at 0 range 15 .. 15;
RXINV at 0 range 16 .. 16;
TXINV at 0 range 17 .. 17;
TAINV at 0 range 18 .. 18;
MSBFIRST at 0 range 19 .. 19;
ABREN at 0 range 20 .. 20;
ABRMOD at 0 range 21 .. 22;
RTOEN at 0 range 23 .. 23;
ADD0_3 at 0 range 24 .. 27;
ADD4_7 at 0 range 28 .. 31;
end record;
subtype CR3_SCARCNT_Field is HAL.UInt3;
subtype CR3_WUS_Field is HAL.UInt2;
-- Control register 3
type CR3_Register is record
-- Error interrupt enable
EIE : Boolean := False;
-- Ir mode enable
IREN : Boolean := False;
-- Ir low-power
IRLP : Boolean := False;
-- Half-duplex selection
HDSEL : Boolean := False;
-- Smartcard NACK enable
NACK : Boolean := False;
-- Smartcard mode enable
SCEN : Boolean := False;
-- DMA enable receiver
DMAR : Boolean := False;
-- DMA enable transmitter
DMAT : Boolean := False;
-- RTS enable
RTSE : Boolean := False;
-- CTS enable
CTSE : Boolean := False;
-- CTS interrupt enable
CTSIE : Boolean := False;
-- One sample bit method enable
ONEBIT : Boolean := False;
-- Overrun Disable
OVRDIS : Boolean := False;
-- DMA Disable on Reception Error
DDRE : Boolean := False;
-- Driver enable mode
DEM : Boolean := False;
-- Driver enable polarity selection
DEP : Boolean := False;
-- unspecified
Reserved_16_16 : HAL.Bit := 16#0#;
-- Smartcard auto-retry count
SCARCNT : CR3_SCARCNT_Field := 16#0#;
-- Wakeup from Stop mode interrupt flag selection
WUS : CR3_WUS_Field := 16#0#;
-- Wakeup from Stop mode interrupt enable
WUFIE : Boolean := False;
-- unspecified
Reserved_23_31 : HAL.UInt9 := 16#0#;
end record
with Volatile_Full_Access, Size => 32,
Bit_Order => System.Low_Order_First;
for CR3_Register use record
EIE at 0 range 0 .. 0;
IREN at 0 range 1 .. 1;
IRLP at 0 range 2 .. 2;
HDSEL at 0 range 3 .. 3;
NACK at 0 range 4 .. 4;
SCEN at 0 range 5 .. 5;
DMAR at 0 range 6 .. 6;
DMAT at 0 range 7 .. 7;
RTSE at 0 range 8 .. 8;
CTSE at 0 range 9 .. 9;
CTSIE at 0 range 10 .. 10;
ONEBIT at 0 range 11 .. 11;
OVRDIS at 0 range 12 .. 12;
DDRE at 0 range 13 .. 13;
DEM at 0 range 14 .. 14;
DEP at 0 range 15 .. 15;
Reserved_16_16 at 0 range 16 .. 16;
SCARCNT at 0 range 17 .. 19;
WUS at 0 range 20 .. 21;
WUFIE at 0 range 22 .. 22;
Reserved_23_31 at 0 range 23 .. 31;
end record;
subtype BRR_DIV_Fraction_Field is HAL.UInt4;
subtype BRR_DIV_Mantissa_Field is HAL.UInt12;
-- Baud rate register
type BRR_Register is record
-- DIV_Fraction
DIV_Fraction : BRR_DIV_Fraction_Field := 16#0#;
-- DIV_Mantissa
DIV_Mantissa : BRR_DIV_Mantissa_Field := 16#0#;
-- unspecified
Reserved_16_31 : HAL.UInt16 := 16#0#;
end record
with Volatile_Full_Access, Size => 32,
Bit_Order => System.Low_Order_First;
for BRR_Register use record
DIV_Fraction at 0 range 0 .. 3;
DIV_Mantissa at 0 range 4 .. 15;
Reserved_16_31 at 0 range 16 .. 31;
end record;
subtype GTPR_PSC_Field is HAL.UInt8;
subtype GTPR_GT_Field is HAL.UInt8;
-- Guard time and prescaler register
type GTPR_Register is record
-- Prescaler value
PSC : GTPR_PSC_Field := 16#0#;
-- Guard time value
GT : GTPR_GT_Field := 16#0#;
-- unspecified
Reserved_16_31 : HAL.UInt16 := 16#0#;
end record
with Volatile_Full_Access, Size => 32,
Bit_Order => System.Low_Order_First;
for GTPR_Register use record
PSC at 0 range 0 .. 7;
GT at 0 range 8 .. 15;
Reserved_16_31 at 0 range 16 .. 31;
end record;
subtype RTOR_RTO_Field is HAL.UInt24;
subtype RTOR_BLEN_Field is HAL.UInt8;
-- Receiver timeout register
type RTOR_Register is record
-- Receiver timeout value
RTO : RTOR_RTO_Field := 16#0#;
-- Block Length
BLEN : RTOR_BLEN_Field := 16#0#;
end record
with Volatile_Full_Access, Size => 32,
Bit_Order => System.Low_Order_First;
for RTOR_Register use record
RTO at 0 range 0 .. 23;
BLEN at 0 range 24 .. 31;
end record;
-- Request register
type RQR_Register is record
-- Write-only. Auto baud rate request
ABRRQ : Boolean := False;
-- Write-only. Send break request
SBKRQ : Boolean := False;
-- Write-only. Mute mode request
MMRQ : Boolean := False;
-- Write-only. Receive data flush request
RXFRQ : Boolean := False;
-- Write-only. Transmit data flush request
TXFRQ : Boolean := False;
-- unspecified
Reserved_5_31 : HAL.UInt27 := 16#0#;
end record
with Volatile_Full_Access, Size => 32,
Bit_Order => System.Low_Order_First;
for RQR_Register use record
ABRRQ at 0 range 0 .. 0;
SBKRQ at 0 range 1 .. 1;
MMRQ at 0 range 2 .. 2;
RXFRQ at 0 range 3 .. 3;
TXFRQ at 0 range 4 .. 4;
Reserved_5_31 at 0 range 5 .. 31;
end record;
-- Interrupt & status register
type ISR_Register is record
-- Read-only. PE
PE : Boolean;
-- Read-only. FE
FE : Boolean;
-- Read-only. NF
NF : Boolean;
-- Read-only. ORE
ORE : Boolean;
-- Read-only. IDLE
IDLE : Boolean;
-- Read-only. RXNE
RXNE : Boolean;
-- Read-only. TC
TC : Boolean;
-- Read-only. TXE
TXE : Boolean;
-- Read-only. LBDF
LBDF : Boolean;
-- Read-only. CTSIF
CTSIF : Boolean;
-- Read-only. CTS
CTS : Boolean;
-- Read-only. RTOF
RTOF : Boolean;
-- Read-only. EOBF
EOBF : Boolean;
-- unspecified
Reserved_13_13 : HAL.Bit;
-- Read-only. ABRE
ABRE : Boolean;
-- Read-only. ABRF
ABRF : Boolean;
-- Read-only. BUSY
BUSY : Boolean;
-- Read-only. CMF
CMF : Boolean;
-- Read-only. SBKF
SBKF : Boolean;
-- Read-only. RWU
RWU : Boolean;
-- Read-only. WUF
WUF : Boolean;
-- Read-only. TEACK
TEACK : Boolean;
-- Read-only. REACK
REACK : Boolean;
-- unspecified
Reserved_23_31 : HAL.UInt9;
end record
with Volatile_Full_Access, Size => 32,
Bit_Order => System.Low_Order_First;
for ISR_Register use record
PE at 0 range 0 .. 0;
FE at 0 range 1 .. 1;
NF at 0 range 2 .. 2;
ORE at 0 range 3 .. 3;
IDLE at 0 range 4 .. 4;
RXNE at 0 range 5 .. 5;
TC at 0 range 6 .. 6;
TXE at 0 range 7 .. 7;
LBDF at 0 range 8 .. 8;
CTSIF at 0 range 9 .. 9;
CTS at 0 range 10 .. 10;
RTOF at 0 range 11 .. 11;
EOBF at 0 range 12 .. 12;
Reserved_13_13 at 0 range 13 .. 13;
ABRE at 0 range 14 .. 14;
ABRF at 0 range 15 .. 15;
BUSY at 0 range 16 .. 16;
CMF at 0 range 17 .. 17;
SBKF at 0 range 18 .. 18;
RWU at 0 range 19 .. 19;
WUF at 0 range 20 .. 20;
TEACK at 0 range 21 .. 21;
REACK at 0 range 22 .. 22;
Reserved_23_31 at 0 range 23 .. 31;
end record;
-- Interrupt flag clear register
type ICR_Register is record
-- Write-only. Parity error clear flag
PECF : Boolean := False;
-- Write-only. Framing error clear flag
FECF : Boolean := False;
-- Write-only. Noise detected clear flag
NCF : Boolean := False;
-- Write-only. Overrun error clear flag
ORECF : Boolean := False;
-- Write-only. Idle line detected clear flag
IDLECF : Boolean := False;
-- unspecified
Reserved_5_5 : HAL.Bit := 16#0#;
-- Write-only. Transmission complete clear flag
TCCF : Boolean := False;
-- unspecified
Reserved_7_7 : HAL.Bit := 16#0#;
-- Write-only. LIN break detection clear flag
LBDCF : Boolean := False;
-- Write-only. CTS clear flag
CTSCF : Boolean := False;
-- unspecified
Reserved_10_10 : HAL.Bit := 16#0#;
-- Write-only. Receiver timeout clear flag
RTOCF : Boolean := False;
-- Write-only. End of block clear flag
EOBCF : Boolean := False;
-- unspecified
Reserved_13_16 : HAL.UInt4 := 16#0#;
-- Write-only. Character match clear flag
CMCF : Boolean := False;
-- unspecified
Reserved_18_19 : HAL.UInt2 := 16#0#;
-- Write-only. Wakeup from Stop mode clear flag
WUCF : Boolean := False;
-- unspecified
Reserved_21_31 : HAL.UInt11 := 16#0#;
end record
with Volatile_Full_Access, Size => 32,
Bit_Order => System.Low_Order_First;
for ICR_Register use record
PECF at 0 range 0 .. 0;
FECF at 0 range 1 .. 1;
NCF at 0 range 2 .. 2;
ORECF at 0 range 3 .. 3;
IDLECF at 0 range 4 .. 4;
Reserved_5_5 at 0 range 5 .. 5;
TCCF at 0 range 6 .. 6;
Reserved_7_7 at 0 range 7 .. 7;
LBDCF at 0 range 8 .. 8;
CTSCF at 0 range 9 .. 9;
Reserved_10_10 at 0 range 10 .. 10;
RTOCF at 0 range 11 .. 11;
EOBCF at 0 range 12 .. 12;
Reserved_13_16 at 0 range 13 .. 16;
CMCF at 0 range 17 .. 17;
Reserved_18_19 at 0 range 18 .. 19;
WUCF at 0 range 20 .. 20;
Reserved_21_31 at 0 range 21 .. 31;
end record;
subtype RDR_RDR_Field is HAL.UInt9;
-- Receive data register
type RDR_Register is record
-- Read-only. Receive data value
RDR : RDR_RDR_Field;
-- unspecified
Reserved_9_31 : HAL.UInt23;
end record
with Volatile_Full_Access, Size => 32,
Bit_Order => System.Low_Order_First;
for RDR_Register use record
RDR at 0 range 0 .. 8;
Reserved_9_31 at 0 range 9 .. 31;
end record;
subtype TDR_TDR_Field is HAL.UInt9;
-- Transmit data register
type TDR_Register is record
-- Transmit data value
TDR : TDR_TDR_Field := 16#0#;
-- unspecified
Reserved_9_31 : HAL.UInt23 := 16#0#;
end record
with Volatile_Full_Access, Size => 32,
Bit_Order => System.Low_Order_First;
for TDR_Register use record
TDR at 0 range 0 .. 8;
Reserved_9_31 at 0 range 9 .. 31;
end record;
-----------------
-- Peripherals --
-----------------
-- Universal synchronous asynchronous receiver transmitter
type USART_Peripheral is record
-- Control register 1
CR1 : aliased CR1_Register;
-- Control register 2
CR2 : aliased CR2_Register;
-- Control register 3
CR3 : aliased CR3_Register;
-- Baud rate register
BRR : aliased BRR_Register;
-- Guard time and prescaler register
GTPR : aliased GTPR_Register;
-- Receiver timeout register
RTOR : aliased RTOR_Register;
-- Request register
RQR : aliased RQR_Register;
-- Interrupt & status register
ISR : aliased ISR_Register;
-- Interrupt flag clear register
ICR : aliased ICR_Register;
-- Receive data register
RDR : aliased RDR_Register;
-- Transmit data register
TDR : aliased TDR_Register;
end record
with Volatile;
for USART_Peripheral use record
CR1 at 16#0# range 0 .. 31;
CR2 at 16#4# range 0 .. 31;
CR3 at 16#8# range 0 .. 31;
BRR at 16#C# range 0 .. 31;
GTPR at 16#10# range 0 .. 31;
RTOR at 16#14# range 0 .. 31;
RQR at 16#18# range 0 .. 31;
ISR at 16#1C# range 0 .. 31;
ICR at 16#20# range 0 .. 31;
RDR at 16#24# range 0 .. 31;
TDR at 16#28# range 0 .. 31;
end record;
-- Universal synchronous asynchronous receiver transmitter
UART4_Periph : aliased USART_Peripheral
with Import, Address => System'To_Address (16#40004C00#);
-- Universal synchronous asynchronous receiver transmitter
UART5_Periph : aliased USART_Peripheral
with Import, Address => System'To_Address (16#40005000#);
-- Universal synchronous asynchronous receiver transmitter
UART7_Periph : aliased USART_Peripheral
with Import, Address => System'To_Address (16#40007800#);
-- Universal synchronous asynchronous receiver transmitter
UART8_Periph : aliased USART_Peripheral
with Import, Address => System'To_Address (16#40007C00#);
-- Universal synchronous asynchronous receiver transmitter
USART1_Periph : aliased USART_Peripheral
with Import, Address => System'To_Address (16#40011000#);
-- Universal synchronous asynchronous receiver transmitter
USART2_Periph : aliased USART_Peripheral
with Import, Address => System'To_Address (16#40004400#);
-- Universal synchronous asynchronous receiver transmitter
USART3_Periph : aliased USART_Peripheral
with Import, Address => System'To_Address (16#40004800#);
-- Universal synchronous asynchronous receiver transmitter
USART6_Periph : aliased USART_Peripheral
with Import, Address => System'To_Address (16#40011400#);
end STM32_SVD.USART;
|
zertovitch/excel-writer | Ada | 9,248 | adb | -- --
-- package Copyright (c) Dmitry A. Kazakov --
-- IEEE_754.Generic_Double_Precision Luebeck --
-- Implementation Summer, 2008 --
-- --
-- Last revision : 09:27 06 Nov 2016 --
-- --
-- This library is free software; you can redistribute it and/or --
-- modify it under the terms of the GNU General Public License as --
-- published by the Free Software Foundation; either version 2 of --
-- the License, or (at your option) any later version. This library --
-- is distributed in the hope that it will be useful, but WITHOUT --
-- ANY WARRANTY; without even the implied warranty of --
-- MERCHANTABILITY or FITNESS FOR A PARTICULAR PURPOSE. See the GNU --
-- General Public License for more details. You should have --
-- received a copy of the GNU General Public License along with --
-- this library; if not, write to the Free Software Foundation, --
-- Inc., 59 Temple Place - Suite 330, Boston, MA 02111-1307, USA. --
-- --
-- As a special exception, if other files instantiate generics from --
-- this unit, or you link this unit with other files to produce an --
-- executable, this unit does not by itself cause the resulting --
-- executable to be covered by the GNU General Public License. This --
-- exception does not however invalidate any other reasons why the --
-- executable file might be covered by the GNU Public License. --
--____________________________________________________________________--
package body IEEE_754.Generic_Double_Precision is
Exponent_Bias : constant := 2**10 - 1;
Exponent_First : constant := -51;
Exponent_Last : constant := 2**11 - 1;
Fraction_Bits : constant := 52;
Mantissa_Bits : constant := 53;
function Extract_Exponent (Value : Float_64) return Integer is
pragma Inline (Extract_Exponent);
begin
return
Integer
(Shift_Left (Unsigned_16 (Value (1)) and 16#7F#, 4)
or Shift_Right (Unsigned_16 (Value (2)), 4)
);
end Extract_Exponent;
function Extract_Mantissa (Value : Float_64) return Unsigned_64 is
pragma Inline (Extract_Mantissa);
begin
return
(Unsigned_64 (Value (8))
or Shift_Left (Unsigned_64 (Value (7)), 8)
or Shift_Left (Unsigned_64 (Value (6)), 2 * 8)
or Shift_Left (Unsigned_64 (Value (5)), 3 * 8)
or Shift_Left (Unsigned_64 (Value (4)), 4 * 8)
or Shift_Left (Unsigned_64 (Value (3)), 5 * 8)
or Shift_Left (Unsigned_64 (Value (2)) and 16#0F#, 6 * 8)
or 2 ** Fraction_Bits
);
end Extract_Mantissa;
procedure Normalize
(Value : Number;
Mantissa : out Unsigned_64;
Exponent : out Integer
) is
begin
if Number'Machine_Radix = 2 then
--
-- The machine radix is binary. We can use the hardware
-- representation attributes in order to get the exponent and
-- the fraction.
--
Exponent := Number'Exponent (Value) - Mantissa_Bits;
Mantissa := Unsigned_64 (Number'Scaling (Value, -Exponent));
else
--
-- OK, this gets more tricky. The number is normalized to be in
-- the range 2**53 > X >= 2**52, by multiplying to the powers
-- of two. Some optimization is made to factor out the powers
-- 2**(2**n)). Though we do not use powers bigger than 30.
--
declare
Accum : Number := Value;
Shift : Integer;
begin
Exponent := 0;
if Accum < 2.0**Fraction_Bits then
Shift := 24;
while Shift > 0 loop
if Accum < 2.0**(Mantissa_Bits - Shift) then
Accum := Accum * 2.0**Shift;
Exponent := Exponent - Shift;
else
Shift := Shift / 2;
end if;
end loop;
elsif Accum >= 2.0**Mantissa_Bits then
Shift := 8;
while Shift > 0 loop
if Accum >= 2.0**(Fraction_Bits + Shift) then
Accum := Accum / 2.0**Shift;
Exponent := Exponent + Shift;
else
Shift := Shift / 2;
end if;
end loop;
end if;
Mantissa := Unsigned_64 (Accum);
end;
end if;
end Normalize;
function From_IEEE (Value : Float_64) return Number is
begin
if 0 = (Value (1) and 16#7F#)
and then
Value (2) = 0
and then
Value (3) = 0
and then
Value (4) = 0
and then
Value (5) = 0
and then
Value (6) = 0
and then
Value (7) = 0
and then
Value (8) = 0
then
return 0.0;
end if;
declare
Power : Integer := Extract_Exponent (Value);
Fraction : Unsigned_64 := Extract_Mantissa (Value);
Result : Number;
begin
if Power = Exponent_Last then
if Fraction /= 2#1000_0000_0000# then
raise Not_A_Number_Error;
elsif Value (1) > 127 then
raise Negative_Overflow_Error;
else
raise Positive_Overflow_Error;
end if;
elsif Power = 0 then -- Denormalized number
Fraction := Fraction and 16#0F_FF_FF_FF_FF_FF_FF_FF#;
Power := Exponent_First - Exponent_Bias;
if Number'Machine_Radix = 2 then
Result := Number'Scaling (Number (Fraction), Power);
else
Result := Number (Fraction) * 2.0 ** Power;
end if;
else -- Normalized number
Power := Power - Exponent_Bias - Fraction_Bits;
if Number'Machine_Radix = 2 then
Result := Number'Scaling (Number (Fraction), Power);
else
Result := Number (Fraction) * 2.0 ** Power;
end if;
end if;
if Value (1) > 127 then
return -Result;
else
return Result;
end if;
exception
when Constraint_Error =>
if Value (1) > 127 then
raise Negative_Overflow_Error;
else
raise Positive_Overflow_Error;
end if;
end;
end From_IEEE;
function Is_NaN (Value : Float_64) return Boolean is
begin
return
(Extract_Exponent (Value) = Exponent_Last
and then
Extract_Mantissa (Value) /= 2 ** Fraction_Bits
);
end Is_NaN;
function Is_Negative (Value : Float_64) return Boolean is
begin
return Value (1) > 127;
end Is_Negative;
function Is_Real (Value : Float_64) return Boolean is
begin
return Extract_Exponent (Value) < Exponent_Last;
end Is_Real;
function To_IEEE (Value : Number) return Float_64 is
begin
if Value = 0.0 then
return (others => 0);
end if;
declare
Exponent : Integer;
Fraction : Unsigned_64;
Sign : Byte := 0;
begin
if Value > 0.0 then
Normalize (Value, Fraction, Exponent);
else
Normalize (-Value, Fraction, Exponent);
Sign := 2**7;
end if;
Exponent := Exponent + Exponent_Bias + Fraction_Bits;
if Exponent < Exponent_First then
-- Underflow, resuls in zero
return (others => 0);
elsif Exponent >= Exponent_Last then
-- Overflow, results in infinities
if Sign = 0 then
return Positive_Infinity;
else
return Negative_Infinity;
end if;
elsif Exponent <= 0 then -- Denormalized
Fraction := Shift_Right (Fraction, 1 - Exponent);
Exponent := 0;
end if;
return
(Sign or Byte (Exponent / 2**4),
(Byte (Shift_Right (Fraction, 8 * 6) and 16#0F#)
or Shift_Left (Byte (Exponent mod 2**4), 4)
),
Byte (Shift_Right (Fraction, 8 * 5) and 16#FF#),
Byte (Shift_Right (Fraction, 8 * 4) and 16#FF#),
Byte (Shift_Right (Fraction, 8 * 3) and 16#FF#),
Byte (Shift_Right (Fraction, 8 * 2) and 16#FF#),
Byte (Shift_Right (Fraction, 8) and 16#FF#),
Byte (Fraction and 16#FF#)
);
end;
end To_IEEE;
end IEEE_754.Generic_Double_Precision;
|
glencornell/ada-object-framework | Ada | 1,321 | ads | -- Copyright (C) 2020 Glen Cornell <[email protected]>
--
-- This program is free software: you can redistribute it and/or
-- modify it under the terms of the GNU General Public License as
-- published by the Free Software Foundation, either version 3 of the
-- License, or (at your option) any later version.
--
-- This program is distributed in the hope that it will be useful,
-- but WITHOUT ANY WARRANTY; without even the implied warranty of
-- MERCHANTABILITY or FITNESS FOR A PARTICULAR PURPOSE. See the GNU
-- General Public License for more details.
--
-- You should have received a copy of the GNU General Public License
-- along with this program. If not, see
-- <http://www.gnu.org/licenses/>.
package Aof.Core.Abstract_Properties is
pragma Pure;
type Access_Mode is (RW, RO, WO);
type Abstract_Property is abstract tagged limited record
Access_Permissions : Access_Mode := RW;
end record;
function Is_Readable (This : Abstract_Property) return Boolean is
(case This.Access_Permissions is
when RW | RO => True,
when WO => False);
function Is_Writable (This : Abstract_Property) return Boolean is
(case This.Access_Permissions is
when RW | WO => True,
when RO => False);
end Aof.Core.Abstract_Properties;
|
DrenfongWong/tkm-rpc | Ada | 405 | ads | with Ada.Unchecked_Conversion;
package Tkmrpc.Response.Ike.Esa_Select.Convert is
function To_Response is new Ada.Unchecked_Conversion (
Source => Esa_Select.Response_Type,
Target => Response.Data_Type);
function From_Response is new Ada.Unchecked_Conversion (
Source => Response.Data_Type,
Target => Esa_Select.Response_Type);
end Tkmrpc.Response.Ike.Esa_Select.Convert;
|
MinimSecure/unum-sdk | Ada | 756 | adb | -- Copyright 2008-2016 Free Software Foundation, Inc.
--
-- This program is free software; you can redistribute it and/or modify
-- it under the terms of the GNU General Public License as published by
-- the Free Software Foundation; either version 3 of the License, or
-- (at your option) any later version.
--
-- This program is distributed in the hope that it will be useful,
-- but WITHOUT ANY WARRANTY; without even the implied warranty of
-- MERCHANTABILITY or FITNESS FOR A PARTICULAR PURPOSE. See the
-- GNU General Public License for more details.
--
-- You should have received a copy of the GNU General Public License
-- along with this program. If not, see <http://www.gnu.org/licenses/>.
procedure Foo is
begin
null;
end Foo;
|
reznikmm/matreshka | Ada | 6,870 | adb | with Ada.Unchecked_Conversion;
with League.Calendars.ISO_8601;
package body Zip.IO_Types is
generic
type Element is (<>);
Length : Ada.Streams.Stream_Element_Offset;
package Generic_IO is
procedure Read
(Stream : not null access Ada.Streams.Root_Stream_Type'Class;
Item : out Element);
procedure Write
(Stream : not null access Ada.Streams.Root_Stream_Type'Class;
Item : Element);
end Generic_IO;
type Raw_Time is record
Hours : League.Calendars.ISO_8601.Hour_Number;
Minutes : League.Calendars.ISO_8601.Minute_Number;
Seconds : League.Calendars.ISO_8601.Second_Number range 0 .. 30;
end record with Size => Unsigned_16'Size;
for Raw_Time use record
Seconds at 0 range 0 .. 4;
Minutes at 0 range 5 .. 10;
Hours at 0 range 11 .. 15;
end record;
type Raw_Date is record
Day : League.Calendars.ISO_8601.Day_Number;
Month : League.Calendars.ISO_8601.Month_Number;
Year : League.Calendars.ISO_8601.Year_Number range 0 .. 127;
end record with Size => Unsigned_16'Size;
for Raw_Date use record
Day at 0 range 0 .. 4;
Month at 0 range 5 .. 8;
Year at 0 range 9 .. 15;
end record;
----------------
-- Generic_IO --
----------------
package body Generic_IO is
type Unsigned_32 is mod 2 ** 32;
----------
-- Read --
----------
procedure Read
(Stream : not null access Ada.Streams.Root_Stream_Type'Class;
Item : out Element)
is
use type Ada.Streams.Stream_Element_Offset;
Input : Ada.Streams.Stream_Element_Array (1 .. Length);
Last : Ada.Streams.Stream_Element_Offset;
Value : Unsigned_32 := 0;
begin
Stream.Read (Input, Last);
pragma Assert (Last = Input'Last);
for J of reverse Input loop
Value := Value * 2 ** 8 + Unsigned_32 (J);
end loop;
Item := Element'Val (Value);
end Read;
-----------
-- Write --
-----------
procedure Write
(Stream : not null access Ada.Streams.Root_Stream_Type'Class;
Item : Element)
is
Value : Unsigned_32 := Element'Pos (Item);
Output : Ada.Streams.Stream_Element_Array (1 .. Length);
begin
for J of Output loop
J := Ada.Streams.Stream_Element (Value mod 2 ** 8);
Value := Value / 2 ** 8;
end loop;
Stream.Write (Output);
end Write;
end Generic_IO;
package Unsigned_16_IO is new Generic_IO (Unsigned_16, 2);
package Unsigned_32_IO is new Generic_IO (Unsigned_32, 4);
procedure Read
(Stream : not null access Ada.Streams.Root_Stream_Type'Class;
Item : out Unsigned_16) renames Unsigned_16_IO.Read;
procedure Write
(Stream : not null access Ada.Streams.Root_Stream_Type'Class;
Item : Unsigned_16) renames Unsigned_16_IO.Write;
procedure Read
(Stream : not null access Ada.Streams.Root_Stream_Type'Class;
Item : out Unsigned_32) renames Unsigned_32_IO.Read;
procedure Write
(Stream : not null access Ada.Streams.Root_Stream_Type'Class;
Item : Unsigned_32) renames Unsigned_32_IO.Write;
----------
-- Read --
----------
procedure Read
(Stream : not null access Ada.Streams.Root_Stream_Type'Class;
Item : out Method)
is
function Cast is new Ada.Unchecked_Conversion (Unsigned_16, Method);
Input : Unsigned_16;
begin
Unsigned_16'Read (Stream, Input);
Item := Cast (Input);
end Read;
-----------
-- Write --
-----------
procedure Write
(Stream : not null access Ada.Streams.Root_Stream_Type'Class;
Item : Method)
is
function Cast is new Ada.Unchecked_Conversion (Method, Unsigned_16);
Output : constant Unsigned_16 := Cast (Item);
begin
Unsigned_16'Write (Stream, Output);
end Write;
----------
-- Read --
----------
procedure Read
(Stream : not null access Ada.Streams.Root_Stream_Type'Class;
Item : out Date_Time)
is
function Cast_Time is
new Ada.Unchecked_Conversion (Unsigned_16, Raw_Time);
function Cast_Date is
new Ada.Unchecked_Conversion (Unsigned_16, Raw_Date);
Input_Time : Unsigned_16;
Input_Date : Unsigned_16;
begin
Unsigned_16'Read (Stream, Input_Time);
Unsigned_16'Read (Stream, Input_Date);
declare
use type League.Calendars.ISO_8601.Year_Number;
use type League.Calendars.ISO_8601.Second_Number;
Time : constant Raw_Time := Cast_Time (Input_Time);
Date : constant Raw_Date := Cast_Date (Input_Date);
Result : constant League.Calendars.Date_Time :=
League.Calendars.ISO_8601.Create
(Year => 1980 + Date.Year,
Month => Date.Month,
Day => Date.Day,
Hour => Time.Hours,
Minute => Time.Minutes,
Second => Time.Seconds * 2,
Nanosecond_100 => 0);
begin
Item := Date_Time (Result);
end;
end Read;
-----------
-- Write --
-----------
procedure Write
(Stream : not null access Ada.Streams.Root_Stream_Type'Class;
Item : Date_Time)
is
function Cast_Time is
new Ada.Unchecked_Conversion (Raw_Time, Unsigned_16);
function Cast_Date is
new Ada.Unchecked_Conversion (Raw_Date, Unsigned_16);
Year : League.Calendars.ISO_8601.Year_Number;
Month : League.Calendars.ISO_8601.Month_Number;
Day : League.Calendars.ISO_8601.Day_Number;
Hour : League.Calendars.ISO_8601.Hour_Number;
Minute : League.Calendars.ISO_8601.Minute_Number;
Second : League.Calendars.ISO_8601.Second_Number;
Nanosecond_100 : League.Calendars.ISO_8601.Nanosecond_100_Number;
begin
League.Calendars.ISO_8601.Split
(League.Calendars.Date_Time (Item),
Year, Month, Day,
Hour, Minute, Second, Nanosecond_100);
declare
use type League.Calendars.ISO_8601.Year_Number;
use type League.Calendars.ISO_8601.Second_Number;
Time : constant Raw_Time :=
(Hours => Hour,
Minutes => Minute,
Seconds => Second / 2);
Date : constant Raw_Date :=
(Year => Year - 1980,
Month => Month,
Day => Day);
Output_Time : Unsigned_16 := Cast_Time (Time);
Output_Date : Unsigned_16 := Cast_Date (Date);
begin
Unsigned_16'Write (Stream, Output_Time);
Unsigned_16'Write (Stream, Output_Date);
end;
end Write;
end Zip.IO_Types;
|
alexcamposruiz/dds-requestreply | Ada | 3,085 | ads | with DDS.Typed_DataWriter_Generic;
with DDS.Typed_DataReader_Generic;
generic
with package ReqDataWriter is new DDS.Typed_DataWriter_Generic (<>);
with package ReqDataReader is new DDS.Typed_DataReader_Generic (<>);
package DDS.Request_Reply.Connext_C_Replier.Generic_REPLIER is
package TReq renames ReqDataWRiter.Treats;
package TRep renames ReqDataReader.Treats;
type TReplier is new RTI_Connext_Replier with null record;
type TReplier_Access is access all TReplier'Class;
function Create ( Participant : DDS.DomainParticipant.Ref_Access;
Service_Name : DDS.String) return TReplier_Access;
function Create_W_Params (Params : RTI_Connext_ReplierParams) return TReplier_Access;
function Take_Request (Self : not null access TReplier;
Request : out TReq.Data_Type;
Sample_Info : out DDS.SampleInfo) return DDS.ReturnCode_T;
function Take_Requests (Self : not null access TReplier;
Request : out TReq.Data_Array;
Sample_Info : out DDS.SampleInfo_Seq.Sequence) return DDS.ReturnCode_T;
function Read_Request (Self : not null access TReplier;
Request : out TReq.Data_Type;
Sample_Info : out DDS.SampleInfo) return DDS.ReturnCode_T;
function Read_Requests (Self : not null access TReplier;
Request : out TReq.Data_Array;
Sample_Info : out DDS.SampleInfo_Seq.Sequence) return DDS.ReturnCode_T;
function Receive_Request (Self : not null access TReplier;
Request : out TReq.Data_Type;
Sample_Info : out DDS.SampleInfo;
Max_Wait : DDS.Duration_T) return DDS.ReturnCode_T;
function Receive_Requests (Self : not null access TReplier;
Request : out TReq.Data_Array;
Sample_Info : out DDS.SampleInfo_Seq.Sequence;
Min_Reply_Count : DDS.long;
Max_Reply_Count : DDS.long;
Max_Wait : DDS.Duration_T) return DDS.ReturnCode_T;
function Send_Reply (Self : not null access TReplier;
Reply : TRep.Data_Type;
Related_Request_Info : DDS.SampleIdentity_T) return Dds.ReturnCode_T;
function Get_Request_Datareader (Self : not null access TReplier) return DDS.DataReader.Ref_Access;
function Get_Reply_Datawriter (Self : not null access TReplier) return DDS.DataWriter.Ref_Access;
function Return_Loan (Self : not null access TReplier;
Request : out TReq.Data_Array;
Sample_Info : out DDS.SampleInfo_Seq.Sequence) return Dds.ReturnCode_T;
end DDS.Request_Reply.Connext_C_Replier.Generic_REPLIER;
|
persan/a-cups | Ada | 14,670 | ads | pragma Ada_2005;
pragma Style_Checks (Off);
with Interfaces.C; use Interfaces.C;
with CUPS.bits_types_h;
with Interfaces.C.Strings;
with CUPS.xlocale_h;
with CUPS.sys_types_h;
limited with CUPS.bits_siginfo_h;
with System;
private package CUPS.time_h is
TIME_UTC : constant := 1; -- time.h:182
-- Copyright (C) 1991-2016 Free Software Foundation, Inc.
-- This file is part of the GNU C Library.
-- The GNU C Library is free software; you can redistribute it and/or
-- modify it under the terms of the GNU Lesser General Public
-- License as published by the Free Software Foundation; either
-- version 2.1 of the License, or (at your option) any later version.
-- The GNU C Library is distributed in the hope that it will be useful,
-- but WITHOUT ANY WARRANTY; without even the implied warranty of
-- MERCHANTABILITY or FITNESS FOR A PARTICULAR PURPOSE. See the GNU
-- Lesser General Public License for more details.
-- You should have received a copy of the GNU Lesser General Public
-- License along with the GNU C Library; if not, see
-- <http://www.gnu.org/licenses/>.
-- * ISO C99 Standard: 7.23 Date and time <time.h>
--
-- Get size_t and NULL from <stddef.h>.
-- This defines CLOCKS_PER_SEC, which is the number of processor clock
-- ticks per second.
-- This is the obsolete POSIX.1-1988 name for the same constant.
-- Returned by `clock'.
subtype clock_t is CUPS.bits_types_h.uu_clock_t; -- time.h:59
-- Returned by `time'.
subtype time_t is CUPS.bits_types_h.uu_time_t; -- time.h:75
-- Clock ID used in clock and timer functions.
subtype clockid_t is CUPS.bits_types_h.uu_clockid_t; -- time.h:91
-- Timer ID returned by `timer_create'.
subtype timer_t is CUPS.bits_types_h.uu_timer_t; -- time.h:103
-- This defines __time_t for us.
-- POSIX.1b structure for a time value. This is like a `struct timeval' but
-- has nanoseconds instead of microseconds.
-- Seconds.
type timespec is record
tv_sec : aliased CUPS.bits_types_h.uu_time_t; -- time.h:122
tv_nsec : aliased CUPS.bits_types_h.uu_syscall_slong_t; -- time.h:123
end record;
pragma Convention (C_Pass_By_Copy, timespec); -- time.h:120
-- Nanoseconds.
-- Used by other time functions.
-- Seconds. [0-60] (1 leap second)
type tm is record
tm_sec : aliased int; -- time.h:135
tm_min : aliased int; -- time.h:136
tm_hour : aliased int; -- time.h:137
tm_mday : aliased int; -- time.h:138
tm_mon : aliased int; -- time.h:139
tm_year : aliased int; -- time.h:140
tm_wday : aliased int; -- time.h:141
tm_yday : aliased int; -- time.h:142
tm_isdst : aliased int; -- time.h:143
tm_gmtoff : aliased long; -- time.h:146
tm_zone : Interfaces.C.Strings.chars_ptr; -- time.h:147
end record;
pragma Convention (C_Pass_By_Copy, tm); -- time.h:133
-- Minutes. [0-59]
-- Hours. [0-23]
-- Day. [1-31]
-- Month. [0-11]
-- Year - 1900.
-- Day of week. [0-6]
-- Days in year.[0-365]
-- DST. [-1/0/1]
-- Seconds east of UTC.
-- Timezone abbreviation.
-- Seconds east of UTC.
-- Timezone abbreviation.
-- POSIX.1b structure for timer start values and intervals.
type itimerspec is record
it_interval : aliased timespec; -- time.h:163
it_value : aliased timespec; -- time.h:164
end record;
pragma Convention (C_Pass_By_Copy, itimerspec); -- time.h:161
-- We can use a simple forward declaration.
-- Time base values for timespec_get.
-- Time used by the program so far (user time + system time).
-- The result / CLOCKS_PER_SECOND is program time in seconds.
function clock return clock_t; -- time.h:189
pragma Import (C, clock, "clock");
-- Return the current time and put it in *TIMER if TIMER is not NULL.
function time (uu_timer : access time_t) return time_t; -- time.h:192
pragma Import (C, time, "time");
-- Return the difference between TIME1 and TIME0.
function difftime (uu_time1 : time_t; uu_time0 : time_t) return double; -- time.h:195
pragma Import (C, difftime, "difftime");
-- Return the `time_t' representation of TP and normalize TP.
function mktime (uu_tp : access tm) return time_t; -- time.h:199
pragma Import (C, mktime, "mktime");
-- Format TP into S according to FORMAT.
-- Write no more than MAXSIZE characters and return the number
-- of characters written, or 0 if it would exceed MAXSIZE.
function strftime
(uu_s : Interfaces.C.Strings.chars_ptr;
uu_maxsize : size_t;
uu_format : Interfaces.C.Strings.chars_ptr;
uu_tp : access constant tm) return size_t; -- time.h:205
pragma Import (C, strftime, "strftime");
-- Parse S according to FORMAT and store binary time information in TP.
-- The return value is a pointer to the first unparsed character in S.
function strptime
(uu_s : Interfaces.C.Strings.chars_ptr;
uu_fmt : Interfaces.C.Strings.chars_ptr;
uu_tp : access tm) return Interfaces.C.Strings.chars_ptr; -- time.h:213
pragma Import (C, strptime, "strptime");
-- Similar to the two functions above but take the information from
-- the provided locale and not the global locale.
function strftime_l
(uu_s : Interfaces.C.Strings.chars_ptr;
uu_maxsize : size_t;
uu_format : Interfaces.C.Strings.chars_ptr;
uu_tp : access constant tm;
uu_loc : CUPS.xlocale_h.uu_locale_t) return size_t; -- time.h:223
pragma Import (C, strftime_l, "strftime_l");
function strptime_l
(uu_s : Interfaces.C.Strings.chars_ptr;
uu_fmt : Interfaces.C.Strings.chars_ptr;
uu_tp : access tm;
uu_loc : CUPS.xlocale_h.uu_locale_t) return Interfaces.C.Strings.chars_ptr; -- time.h:230
pragma Import (C, strptime_l, "strptime_l");
-- Return the `struct tm' representation of *TIMER
-- in Universal Coordinated Time (aka Greenwich Mean Time).
function gmtime (uu_timer : access time_t) return access tm; -- time.h:239
pragma Import (C, gmtime, "gmtime");
-- Return the `struct tm' representation
-- of *TIMER in the local timezone.
function localtime (uu_timer : access time_t) return access tm; -- time.h:243
pragma Import (C, localtime, "localtime");
-- Return the `struct tm' representation of *TIMER in UTC,
-- using *TP to store the result.
function gmtime_r (uu_timer : access time_t; uu_tp : access tm) return access tm; -- time.h:249
pragma Import (C, gmtime_r, "gmtime_r");
-- Return the `struct tm' representation of *TIMER in local time,
-- using *TP to store the result.
function localtime_r (uu_timer : access time_t; uu_tp : access tm) return access tm; -- time.h:254
pragma Import (C, localtime_r, "localtime_r");
-- Return a string of the form "Day Mon dd hh:mm:ss yyyy\n"
-- that is the representation of TP in this format.
function asctime (uu_tp : access constant tm) return Interfaces.C.Strings.chars_ptr; -- time.h:261
pragma Import (C, asctime, "asctime");
-- Equivalent to `asctime (localtime (timer))'.
function ctime (uu_timer : access time_t) return Interfaces.C.Strings.chars_ptr; -- time.h:264
pragma Import (C, ctime, "ctime");
-- Reentrant versions of the above functions.
-- Return in BUF a string of the form "Day Mon dd hh:mm:ss yyyy\n"
-- that is the representation of TP in this format.
function asctime_r (uu_tp : access constant tm; uu_buf : Interfaces.C.Strings.chars_ptr) return Interfaces.C.Strings.chars_ptr; -- time.h:272
pragma Import (C, asctime_r, "asctime_r");
-- Equivalent to `asctime_r (localtime_r (timer, *TMP*), buf)'.
function ctime_r (uu_timer : access time_t; uu_buf : Interfaces.C.Strings.chars_ptr) return Interfaces.C.Strings.chars_ptr; -- time.h:276
pragma Import (C, ctime_r, "ctime_r");
-- Defined in localtime.c.
-- Current timezone names.
-- If daylight-saving time is ever in use.
-- Seconds west of UTC.
-- Same as above.
tzname : array (0 .. 1) of Interfaces.C.Strings.chars_ptr; -- time.h:289
pragma Import (C, tzname, "tzname");
-- Set time conversion information from the TZ environment variable.
-- If TZ is not defined, a locale-dependent default is used.
procedure tzset; -- time.h:293
pragma Import (C, tzset, "tzset");
daylight : aliased int; -- time.h:297
pragma Import (C, daylight, "daylight");
timezone : aliased long; -- time.h:298
pragma Import (C, timezone, "timezone");
-- Set the system time to *WHEN.
-- This call is restricted to the superuser.
function stime (uu_when : access time_t) return int; -- time.h:304
pragma Import (C, stime, "stime");
-- Nonzero if YEAR is a leap year (every 4 years,
-- except every 100th isn't, and every 400th is).
-- Miscellaneous functions many Unices inherited from the public domain
-- localtime package. These are included only for compatibility.
-- Like `mktime', but for TP represents Universal Time, not local time.
function timegm (uu_tp : access tm) return time_t; -- time.h:319
pragma Import (C, timegm, "timegm");
-- Another name for `mktime'.
function timelocal (uu_tp : access tm) return time_t; -- time.h:322
pragma Import (C, timelocal, "timelocal");
-- Return the number of days in YEAR.
function dysize (uu_year : int) return int; -- time.h:325
pragma Import (C, dysize, "dysize");
-- Pause execution for a number of nanoseconds.
-- This function is a cancellation point and therefore not marked with
-- __THROW.
function nanosleep (uu_requested_time : access constant timespec; uu_remaining : access timespec) return int; -- time.h:334
pragma Import (C, nanosleep, "nanosleep");
-- Get resolution of clock CLOCK_ID.
function clock_getres (uu_clock_id : clockid_t; uu_res : access timespec) return int; -- time.h:339
pragma Import (C, clock_getres, "clock_getres");
-- Get current value of clock CLOCK_ID and store it in TP.
function clock_gettime (uu_clock_id : clockid_t; uu_tp : access timespec) return int; -- time.h:342
pragma Import (C, clock_gettime, "clock_gettime");
-- Set clock CLOCK_ID to value TP.
function clock_settime (uu_clock_id : clockid_t; uu_tp : access constant timespec) return int; -- time.h:345
pragma Import (C, clock_settime, "clock_settime");
-- High-resolution sleep with the specified clock.
-- This function is a cancellation point and therefore not marked with
-- __THROW.
function clock_nanosleep
(uu_clock_id : clockid_t;
uu_flags : int;
uu_req : access constant timespec;
uu_rem : access timespec) return int; -- time.h:353
pragma Import (C, clock_nanosleep, "clock_nanosleep");
-- Return clock ID for CPU-time clock.
function clock_getcpuclockid (uu_pid : CUPS.sys_types_h.pid_t; uu_clock_id : access clockid_t) return int; -- time.h:358
pragma Import (C, clock_getcpuclockid, "clock_getcpuclockid");
-- Create new per-process timer using CLOCK_ID.
function timer_create
(uu_clock_id : clockid_t;
uu_evp : access CUPS.bits_siginfo_h.sigevent;
uu_timerid : System.Address) return int; -- time.h:363
pragma Import (C, timer_create, "timer_create");
-- Delete timer TIMERID.
function timer_delete (uu_timerid : timer_t) return int; -- time.h:368
pragma Import (C, timer_delete, "timer_delete");
-- Set timer TIMERID to VALUE, returning old value in OVALUE.
function timer_settime
(uu_timerid : timer_t;
uu_flags : int;
uu_value : access constant itimerspec;
uu_ovalue : access itimerspec) return int; -- time.h:371
pragma Import (C, timer_settime, "timer_settime");
-- Get current value of timer TIMERID and store it in VALUE.
function timer_gettime (uu_timerid : timer_t; uu_value : access itimerspec) return int; -- time.h:376
pragma Import (C, timer_gettime, "timer_gettime");
-- Get expiration overrun for timer TIMERID.
function timer_getoverrun (uu_timerid : timer_t) return int; -- time.h:380
pragma Import (C, timer_getoverrun, "timer_getoverrun");
-- Set TS to calendar time based in time base BASE.
function timespec_get (uu_ts : access timespec; uu_base : int) return int; -- time.h:386
pragma Import (C, timespec_get, "timespec_get");
-- Set to one of the following values to indicate an error.
-- 1 the DATEMSK environment variable is null or undefined,
-- 2 the template file cannot be opened for reading,
-- 3 failed to get file status information,
-- 4 the template file is not a regular file,
-- 5 an error is encountered while reading the template file,
-- 6 memory allication failed (not enough memory available),
-- 7 there is no line in the template that matches the input,
-- 8 invalid input specification Example: February 31 or a time is
-- specified that can not be represented in a time_t (representing
-- the time in seconds since 00:00:00 UTC, January 1, 1970)
getdate_err : aliased int; -- time.h:403
pragma Import (C, getdate_err, "getdate_err");
-- Parse the given string as a date specification and return a value
-- representing the value. The templates from the file identified by
-- the environment variable DATEMSK are used. In case of an error
-- `getdate_err' is set.
-- This function is a possible cancellation point and therefore not
-- marked with __THROW.
function getdate (uu_string : Interfaces.C.Strings.chars_ptr) return access tm; -- time.h:412
pragma Import (C, getdate, "getdate");
-- Since `getdate' is not reentrant because of the use of `getdate_err'
-- and the static buffer to return the result in, we provide a thread-safe
-- variant. The functionality is the same. The result is returned in
-- the buffer pointed to by RESBUFP and in case of an error the return
-- value is != 0 with the same values as given above for `getdate_err'.
-- This function is not part of POSIX and therefore no official
-- cancellation point. But due to similarity with an POSIX interface
-- or due to the implementation it is a cancellation point and
-- therefore not marked with __THROW.
function getdate_r (uu_string : Interfaces.C.Strings.chars_ptr; uu_resbufp : access tm) return int; -- time.h:426
pragma Import (C, getdate_r, "getdate_r");
end CUPS.time_h;
|
reznikmm/matreshka | Ada | 12,901 | adb | ------------------------------------------------------------------------------
-- --
-- Matreshka Project --
-- --
-- SQL Database Access --
-- --
-- Runtime Library Component --
-- --
------------------------------------------------------------------------------
-- --
-- Copyright © 2011-2022, 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.Streams;
with League.Text_Codecs;
with Matreshka.Internals.SQL_Drivers.PostgreSQL.Queries;
with SQL.Options.Internals;
package body Matreshka.Internals.SQL_Drivers.PostgreSQL.Databases is
ISO_8859_1_Codec : constant League.Text_Codecs.Text_Codec
:= League.Text_Codecs.Codec
(League.Strings.To_Universal_String ("ISO-8859-1"));
-- It is used to convert character endcoding name only.
UTF8_Codec : constant League.Text_Codecs.Text_Codec
:= League.Text_Codecs.Codec
(League.Strings.To_Universal_String ("UTF-8"));
-- It is used everywhere to convert text data.
-----------------------------
-- Allocate_Statement_Name --
-----------------------------
function Allocate_Statement_Name
(Self : not null access PostgreSQL_Database'Class)
return Interfaces.C.Strings.chars_ptr is
begin
Self.Statement := Self.Statement + 1;
return
Interfaces.C.Strings.New_String
("Matreshka" & Integer'Image (Self.Statement));
end Allocate_Statement_Name;
-----------
-- Close --
-----------
overriding procedure Close (Self : not null access PostgreSQL_Database) is
begin
Self.Invalidate_Queries;
if Self.Handle /= null then
PQfinish (Self.Handle);
Self.Handle := null;
end if;
end Close;
------------
-- Commit --
------------
overriding procedure Commit (Self : not null access PostgreSQL_Database) is
begin
null;
end Commit;
-------------------
-- Error_Message --
-------------------
overriding function Error_Message
(Self : not null access PostgreSQL_Database)
return League.Strings.Universal_String is
begin
return Self.Error;
end Error_Message;
--------------
-- Finalize --
--------------
overriding procedure Finalize
(Self : not null access PostgreSQL_Database) is
begin
if Self.Handle /= null then
Self.Close;
end if;
end Finalize;
-----------------------
-- Get_Error_Message --
-----------------------
function Get_Error_Message
(Self : not null access PostgreSQL_Database'Class)
return League.Strings.Universal_String
is
Client_Encoding : constant String
:= Interfaces.C.Strings.Value
(pg_encoding_to_char (PQclientEncoding (Self.Handle)));
Encoding_Source :
Ada.Streams.Stream_Element_Array (1 .. Client_Encoding'Length);
for Encoding_Source'Address use Client_Encoding'Address;
pragma Import (Ada, Encoding_Source);
Encoding : League.Strings.Universal_String
:= ISO_8859_1_Codec.Decode (Encoding_Source);
Message : constant String
:= Interfaces.C.Strings.Value (PQerrorMessage (Self.Handle));
Source : Ada.Streams.Stream_Element_Array (1 .. Message'Length);
for Source'Address use Message'Address;
pragma Import (Ada, Source);
begin
-- pg_encoding_to_char return empty string when encoding is invalid (it
-- is case when connection can't be established). ISO-8859-1 is used
-- as fallback encoding.
if Encoding.Is_Empty then
Encoding := League.Strings.To_Universal_String ("ISO-8859-1");
end if;
-- Set error message.
return League.Text_Codecs.Codec (Encoding).Decode (Source);
end Get_Error_Message;
--------------
-- Get_Type --
--------------
function Get_Type
(Self : not null access PostgreSQL_Database'Class;
Type_Oid : Oid) return Data_Types is
begin
if not Self.Type_Map.Contains (Type_Oid) then
-- Retrieve type name from database and use it to guess data type,
-- when type is not in the cache. Store guessed type in cache.
declare
Query : Interfaces.C.Strings.chars_ptr
:= Interfaces.C.Strings.New_String
("SELECT typname FROM pg_type WHERE oid ="
& Oid'Image (Type_Oid));
Result : PGresult_Access := PQexec (Self.Handle, Query);
Name : constant String
:= Interfaces.C.Strings.Value (PQgetvalue (Result, 0, 0));
begin
Interfaces.C.Strings.Free (Query);
PQclear (Result);
if Name = "int4" then
Self.Type_Map.Insert (Type_Oid, Integer_Data);
elsif Name in "float8" | "float4" then
Self.Type_Map.Insert (Type_Oid, Float_Data);
elsif Name = "varchar" then
Self.Type_Map.Insert (Type_Oid, Text_Data);
elsif Name = "date" then
Self.Type_Map.Insert (Type_Oid, Date_Data);
elsif Name = "timestamp" then
Self.Type_Map.Insert (Type_Oid, Timestamp_Data);
else
Self.Type_Map.Insert (Type_Oid, Text_Data);
end if;
end;
end if;
return Self.Type_Map.Element (Type_Oid);
end Get_Type;
------------
-- Handle --
------------
function Handle
(Self : not null access PostgreSQL_Database'Class) return PGconn_Access is
begin
return Self.Handle;
end Handle;
----------------
-- New_String --
----------------
function New_String
(Item : League.Strings.Universal_String)
return Interfaces.C.Strings.chars_ptr
is
-- XXX This subprogram can be optimized by direct access to
-- Stream_Element_Vector internal storage. This storage can be renamed
-- to S_Item object, thus there is no copy of data needed.
V_Item : constant Ada.Streams.Stream_Element_Array
:= UTF8_Codec.Encode (Item).To_Stream_Element_Array;
S_Item : String (1 .. V_Item'Length);
for S_Item'Address use V_Item'Address;
pragma Import (Ada, S_Item);
begin
return Interfaces.C.Strings.New_String (S_Item);
end New_String;
----------
-- Open --
----------
overriding function Open
(Self : not null access PostgreSQL_Database;
Options : SQL.Options.SQL_Options) return Boolean
is
Options_Size : constant Interfaces.C.size_t
:= Interfaces.C.size_t (SQL.Options.Internals.Length (Options) + 1);
Options_Name : Interfaces.C.Strings.chars_ptr_array (1 .. Options_Size);
Options_Value : Interfaces.C.Strings.chars_ptr_array (1 .. Options_Size);
begin
-- Prepare driver's options.
for J in 1 .. SQL.Options.Internals.Length (Options) loop
Options_Name (Interfaces.C.size_t (J)) :=
New_String (SQL.Options.Internals.Name (Options, J));
Options_Value (Interfaces.C.size_t (J)) :=
New_String (SQL.Options.Internals.Value (Options, J));
end loop;
Options_Name (Options_Size) := Interfaces.C.Strings.Null_Ptr;
Options_Value (Options_Size) := Interfaces.C.Strings.Null_Ptr;
-- Establish connection.
Self.Handle := PQconnectdbParams (Options_Name, Options_Value, 0);
-- Cleanup.
for J in Options_Name'Range loop
Interfaces.C.Strings.Free (Options_Name (J));
end loop;
for J in Options_Value'Range loop
Interfaces.C.Strings.Free (Options_Value (J));
end loop;
-- Handle fatal error.
if Self.Handle = null then
-- PQconnectdb can return null when it unable to allocate memory.
return False;
end if;
-- Check connection status.
if PQstatus (Self.Handle) /= CONNECTION_OK then
-- Sets error message.
Self.Error := Self.Get_Error_Message;
-- Cleanup.
PQfinish (Self.Handle);
Self.Handle := null;
return False;
end if;
-- Set client encoding to UTF-8.
declare
use type Interfaces.C.int;
Encoding : Interfaces.C.Strings.chars_ptr
:= Interfaces.C.Strings.New_String ("UTF8");
begin
if PQsetClientEncoding (Self.Handle, Encoding) /= 0 then
Interfaces.C.Strings.Free (Encoding);
-- Set error message.
Self.Error := Self.Get_Error_Message;
-- Cleanup.
PQfinish (Self.Handle);
Self.Handle := null;
return False;
end if;
Interfaces.C.Strings.Free (Encoding);
end;
-- Set DATESTYLE to ISO.
declare
Query : Interfaces.C.Strings.chars_ptr
:= Interfaces.C.Strings.New_String ("SET DATESTYLE TO 'ISO, DMY'");
Result : constant PGresult_Access := PQexec (Self.Handle, Query);
begin
Interfaces.C.Strings.Free (Query);
PQclear (Result);
end;
-- Set TIMEZONE to UTC.
declare
Query : Interfaces.C.Strings.chars_ptr
:= Interfaces.C.Strings.New_String ("SET TIMEZONE TO 'UTC'");
Result : constant PGresult_Access := PQexec (Self.Handle, Query);
begin
Interfaces.C.Strings.Free (Query);
PQclear (Result);
end;
-- Initialize internal data.
Self.Statement := 0;
return True;
end Open;
-----------
-- Query --
-----------
overriding function Query
(Self : not null access PostgreSQL_Database)
return not null Query_Access is
begin
return Aux : constant not null Query_Access
:= new Queries.PostgreSQL_Query
do
Queries.Initialize
(Queries.PostgreSQL_Query'Class (Aux.all)'Access, Self);
end return;
end Query;
end Matreshka.Internals.SQL_Drivers.PostgreSQL.Databases;
|
leonardoce/ada-iup | Ada | 8,376 | adb | -- The MIT License (MIT)
--
-- Copyright (c) 2014, Leonardo Cecchi
--
-- Permission is hereby granted, free of charge, to any person obtaining a copy
-- of this software and associated documentation files (the "Software"), to deal
-- in the Software without restriction, including without limitation the rights
-- to use, copy, modify, merge, publish, distribute, sublicense, and/or sell
-- copies of the Software, and to permit persons to whom the Software is
-- furnished to do so, subject to the following conditions:
--
-- The above copyright notice and this permission notice shall be included in
-- all copies or substantial portions of the Software.
--
-- THE SOFTWARE IS PROVIDED "AS IS", WITHOUT WARRANTY OF ANY KIND, EXPRESS OR
-- IMPLIED, INCLUDING BUT NOT LIMITED TO THE WARRANTIES OF MERCHANTABILITY,
-- FITNESS FOR A PARTICULAR PURPOSE AND NONINFRINGEMENT. IN NO EVENT SHALL THE
-- AUTHORS OR COPYRIGHT HOLDERS BE LIABLE FOR ANY CLAIM, DAMAGES OR OTHER
-- LIABILITY, WHETHER IN AN ACTION OF CONTRACT, TORT OR OTHERWISE, ARISING FROM,
-- OUT OF OR IN CONNECTION WITH THE SOFTWARE OR THE USE OR OTHER DEALINGS IN
-- THE SOFTWARE.
with Ada.Containers;
with Ada.Containers.Vectors;
with Interfaces.C;
with Interfaces.C.Strings;
package body Iup is
pragma Linker_Options("-liup");
package C renames Interfaces.C;
package CStrings renames Interfaces.C.Strings;
procedure Iup_Open(argc: System.Address; argv:System.Address);
pragma Import(C, Iup_Open, "IupOpen");
function Button(Title:String) return Handle is
function Iup_Button(title:C.char_array; Action:System.Address) return System.Address;
pragma Import(C, Iup_Button, "IupButton");
begin
return Handle(Iup_Button(C.To_C(Title), System.Null_Address));
end Button;
procedure Set_Attribute(Ih:Handle; name:String; value:String) is
procedure Iup_Store_Attribute(Id:Handle; name:C.char_array; value:C.char_array);
pragma Import(C, Iup_Store_Attribute, "IupStoreAttribute");
begin
Iup_Store_Attribute(Ih, C.To_C(name), C.To_C(Value));
end;
function Get_Attribute(Ih:Handle; name:String) return String is
use CStrings;
function Iup_Get_Attribute(Id:Handle; name:C.char_array) return chars_ptr;
pragma Import(C, Iup_Get_Attribute, "IupGetAttribute");
result: chars_ptr := Iup_Get_Attribute(Ih, C.To_C(name));
begin
if result = Null_Ptr then
return "";
else
return Cstrings.Value(result);
end if;
end;
function H_Box return Handle is
function Iup_Hbox(Nope:System.Address) return Handle;
pragma Import(C, Iup_Hbox, "IupHbox");
begin
return Iup_Hbox(System.Null_Address);
end;
function V_Box return Handle is
function Iup_Vbox(Nope:System.Address) return Handle;
pragma Import(C, Iup_Vbox, "IupVbox");
begin
return Iup_Vbox(System.Null_Address);
end;
function Z_Box return Handle is
function Iup_Zbox(Nope:System.Address) return Handle;
pragma Import(C, Iup_Zbox, "IupZbox");
begin
return Iup_Zbox(System.Null_Address);
end;
-- --------------------------------
-- Callback return value management
-- --------------------------------
function Callback_Result_To_Integer(Callback_Result: Callback_Result_Type) return Integer is
begin
case Callback_Result is
when Ignore => return -1;
when Default => return -2;
when Close => return -3;
when Continue => return -4;
when others => return -4;
end case;
end;
function Integer_To_Callback_Result(V: Integer) return Callback_Result_Type is
begin
if V=(-1) then
return Ignore;
elsif V=(-2) then
return Default;
elsif V=(-3) then
return Close;
elsif V=(-4) then
return Continue;
else
return Continue;
end if;
end;
function Loop_Step return Callback_Result_Type is
function Iup_Loop_Step return Integer;
pragma Import(C, Iup_Loop_Step, "IupLoopStep");
begin
return Integer_To_Callback_Result(Iup_Loop_Step);
end;
function Loop_Step_Wait return Callback_Result_Type is
function Iup_Loop_Step_Wait return Integer;
pragma Import(C, Iup_Loop_Step_Wait, "IupLoopStepWait");
begin
return Integer_To_Callback_Result(Iup_Loop_Step_Wait);
end;
-- ------------------------------------------
-- Callback management. Deep black magic here
-- ------------------------------------------
package Callback_Vector_Pkg is new Ada.Containers.Vectors(Positive, Callback_Type);
Ada_Callback_Prefix : constant String := "__ADA_CALLBACK_ID__";
Callback_Vector: Callback_Vector_Pkg.Vector;
subtype Callback_Id_Type is Ada.Containers.Count_Type;
function Internal_Callback(Ih:Handle) return Integer;
pragma Convention(C, Internal_Callback);
function Internal_Callback(Ih:Handle) return Integer is
use type CStrings.chars_ptr;
function Iup_Get_Action_Name return CStrings.chars_ptr;
pragma Import(C, Iup_Get_Action_Name, "IupGetActionName");
C_Callback_Name : CStrings.chars_ptr;
begin
C_Callback_Name := Iup_Get_Action_Name;
if C_Callback_Name = CStrings.Null_Ptr then
raise Program_Error with "IupAda callback invoked from a non Ada callback. Why?";
end if;
declare
Callback_Name : String := CStrings.Value(Iup_Get_Action_Name);
Callback_Id : Callback_Id_Type;
Callback_Result : Callback_Result_Type;
begin
if Callback_Name(Ada_Callback_Prefix'Range) /= Ada_Callback_Prefix then
raise Program_Error with "IupAda callback invoked with the wrong name " & Callback_Name & ". This sounds like an internal error";
end if;
Callback_Id := Callback_Id_Type'Value(Callback_Name(Ada_Callback_Prefix'Last+1..Callback_Name'Last));
Callback_Result := Callback_Vector_Pkg.Element(Callback_Vector, Positive(Callback_Id))(Ih);
return Callback_Result_To_Integer(Callback_Result);
exception
when Constraint_Error => raise Program_Error with "IupAda callback with the wrong id " & Callback_Name;
end;
end;
procedure Set_Callback(Ih:Handle; Name:String; Callback:Callback_Type) is
type Internal_Callback_Access is access function(Ih:Handle) return Integer;
pragma Convention(C, Internal_Callback_Access);
procedure Iup_Set_Callback(Ih:Handle; Name: C.char_array; Callback:Internal_Callback_Access);
pragma Import(C, Iup_Set_Callback, "IupSetCallback");
procedure Iup_Set_Function(Name: C.char_array; Callback:Internal_Callback_Access);
pragma Import(C, Iup_Set_Function, "IupSetFunction");
Callback_Id : Callback_Id_Type;
begin
Callback_Vector_Pkg.Append(Callback_Vector, Callback);
Callback_Id := Callback_Vector_Pkg.Length(Callback_Vector);
declare
Internal_Callback_Name : String := Ada_Callback_Prefix & Callback_Id_Type'Image(Callback_Id);
begin
Iup_Set_Function(C.To_C(Internal_Callback_Name), Internal_Callback'Access);
Set_Attribute(Ih, Name, Internal_Callback_Name);
end;
end;
procedure Append(Ih:Handle; Children: Handle_Array) is
begin
for i in Children'Range loop
Append(Ih, Children(i));
end loop;
end;
function Label(Title:String) return Handle is
function Iup_Label(Title:C.char_array) return Handle;
pragma Import(C, Iup_Label, "IupLabel");
begin
return Iup_Label(C.To_C(Title));
end;
function Grid_Box return Handle is
function Grid_Box(Nope: System.Address) return Handle;
pragma Import(C, Grid_Box, "IupGridBox");
begin
return Grid_Box(System.Null_Address);
end;
function Text return Handle is
function Iup_Text(Nope: System.Address) return Handle;
pragma Import(C, Iup_Text, "IupText");
begin
return Iup_Text(System.Null_Address);
end;
begin
Iup_Open(System.Null_Address, System.Null_Address);
end Iup;
|
caqg/linux-home | Ada | 20,265 | adb | -- generated parser support file.
-- command line: wisitoken-bnf-generate.exe --generate LR1 Ada_Emacs re2c PROCESS gpr.wy
--
-- Copyright (C) 2013 - 2019 Free Software Foundation, Inc.
-- This program is free software; you can redistribute it and/or
-- modify it under the terms of the GNU General Public License as
-- published by the Free Software Foundation; either version 3, 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 <http://www.gnu.org/licenses/>.
with Wisi; use Wisi;
with Wisi.Gpr; use Wisi.Gpr;
package body Gpr_Process_Actions is
use WisiToken.Semantic_Checks;
procedure aggregate_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_Index;
Tokens : in WisiToken.Syntax_Trees.Valid_Node_Index_Array)
is
Parse_Data : Wisi.Parse_Data_Type renames Wisi.Parse_Data_Type (User_Data);
begin
case Parse_Data.Post_Parse_Action is
when Navigate =>
null;
when Face =>
null;
when Indent =>
Indent_Action_0 (Parse_Data, Tree, Nonterm, Tokens, ((False, (Simple, (Int, 0))), (False, (Simple,
(Anchored_0, 1, 1))), (False, (Simple, (Anchored_0, 1, 0)))));
end case;
end aggregate_g_0;
procedure attribute_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_Index;
Tokens : in WisiToken.Syntax_Trees.Valid_Node_Index_Array)
is
Parse_Data : Wisi.Parse_Data_Type renames Wisi.Parse_Data_Type (User_Data);
begin
case Parse_Data.Post_Parse_Action is
when Navigate =>
Statement_Action (Parse_Data, Tree, Nonterm, Tokens, ((1, Statement_Start), (5, Statement_End)));
when Face =>
Face_Apply_Action (Parse_Data, Tree, Nonterm, Tokens, (1 => (2, 1, 0)));
when Indent =>
Indent_Action_0 (Parse_Data, Tree, Nonterm, Tokens, ((False, (Simple, (Int, 0))), (False, (Simple, (Int,
Gpr_Indent_Broken))), (False, (Simple, (Int, 0))), (False, (Simple, (Int, Gpr_Indent_Broken))), (False,
(Simple, (Int, 0)))));
end case;
end attribute_declaration_0;
procedure attribute_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_Index;
Tokens : in WisiToken.Syntax_Trees.Valid_Node_Index_Array)
is
Parse_Data : Wisi.Parse_Data_Type renames Wisi.Parse_Data_Type (User_Data);
begin
case Parse_Data.Post_Parse_Action is
when Navigate =>
Statement_Action (Parse_Data, Tree, Nonterm, Tokens, ((1, Statement_Start), (8, Statement_End)));
when Face =>
Face_Apply_Action (Parse_Data, Tree, Nonterm, Tokens, (1 => (2, 1, 0)));
when Indent =>
Indent_Action_0 (Parse_Data, Tree, Nonterm, Tokens, ((False, (Simple, (Int, 0))), (False, (Simple, (Int,
Gpr_Indent_Broken))), (False, (Simple, (Int, Gpr_Indent_Broken - 1))), (False, (Simple, (Int,
Gpr_Indent_Broken))), (False, (Simple, (Int, Gpr_Indent_Broken - 1))), (False, (Simple, (Int, 0))), (False,
(Simple, (Int, Gpr_Indent_Broken))), (False, (Simple, (Int, 0)))));
end case;
end attribute_declaration_1;
procedure attribute_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_Index;
Tokens : in WisiToken.Syntax_Trees.Valid_Node_Index_Array)
is
Parse_Data : Wisi.Parse_Data_Type renames Wisi.Parse_Data_Type (User_Data);
begin
case Parse_Data.Post_Parse_Action is
when Navigate =>
Statement_Action (Parse_Data, Tree, Nonterm, Tokens, ((1, Statement_Start), (10, Statement_End)));
when Face =>
Face_Apply_Action (Parse_Data, Tree, Nonterm, Tokens, (1 => (2, 1, 0)));
when Indent =>
Indent_Action_0 (Parse_Data, Tree, Nonterm, Tokens, ((False, (Simple, (Int, 0))), (False, (Simple, (Int,
Gpr_Indent_Broken))), (False, (Simple, (Int, Gpr_Indent_Broken - 1))), (False, (Simple, (Int,
Gpr_Indent_Broken))), (False, (Simple, (Int, Gpr_Indent_Broken - 1))), (False, (Simple, (Int, 0))), (False,
(Simple, (Int, Gpr_Indent_Broken))), (False, (Simple, (Int, 0))), (False, (Simple, (Int, 0))), (False,
(Simple, (Int, 0)))));
end case;
end attribute_declaration_2;
procedure attribute_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_Index;
Tokens : in WisiToken.Syntax_Trees.Valid_Node_Index_Array)
is
Parse_Data : Wisi.Parse_Data_Type renames Wisi.Parse_Data_Type (User_Data);
begin
case Parse_Data.Post_Parse_Action is
when Navigate =>
Statement_Action (Parse_Data, Tree, Nonterm, Tokens, ((1, Statement_Start), (8, Statement_End)));
when Face =>
null;
when Indent =>
Indent_Action_0 (Parse_Data, Tree, Nonterm, Tokens, ((False, (Simple, (Int, 0))), (False, (Simple, (Int,
Gpr_Indent_Broken))), (False, (Simple, (Int, Gpr_Indent_Broken - 1))), (False, (Simple, (Int,
Gpr_Indent_Broken))), (False, (Simple, (Int, Gpr_Indent_Broken - 1))), (False, (Simple, (Int, 0))), (False,
(Simple, (Int, Gpr_Indent_Broken))), (False, (Simple, (Int, 0)))));
end case;
end attribute_declaration_3;
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_Index;
Tokens : in WisiToken.Syntax_Trees.Valid_Node_Index_Array)
is
Parse_Data : Wisi.Parse_Data_Type renames Wisi.Parse_Data_Type (User_Data);
begin
case Parse_Data.Post_Parse_Action is
when Navigate =>
Statement_Action (Parse_Data, Tree, Nonterm, Tokens, ((1, Statement_Start), (7, Statement_End)));
Containing_Action (Parse_Data, Tree, Nonterm, Tokens, 1, 4);
when Face =>
null;
when Indent =>
Indent_Action_0 (Parse_Data, Tree, Nonterm, Tokens, ((False, (Simple, (Int, 0))), (False, (Simple, (Int,
Gpr_Indent_Broken))), (False, (Simple, (Int, 0))), (True, (Simple, (Int, Gpr_Indent_When)), (Simple, (Int,
Gpr_Indent_When))), (False, (Simple, (Int, 0))), (False, (Simple, (Int, 0))), (False, (Simple, (Int, 0)))));
end case;
end case_statement_0;
procedure case_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_Index;
Tokens : in WisiToken.Syntax_Trees.Valid_Node_Index_Array)
is
Parse_Data : Wisi.Parse_Data_Type renames Wisi.Parse_Data_Type (User_Data);
begin
case Parse_Data.Post_Parse_Action is
when Navigate =>
Statement_Action (Parse_Data, Tree, Nonterm, Tokens, (1 => (1, Motion)));
when Face =>
null;
when Indent =>
Indent_Action_0 (Parse_Data, Tree, Nonterm, Tokens, ((False, (Simple, (Int, 0))), (False, (Simple, (Int,
Gpr_Indent_Broken))), (False, (Simple, (Int, Gpr_Indent))), (False, (Simple, (Int, Gpr_Indent)))));
end case;
end case_item_0;
procedure compilation_unit_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_Index;
Tokens : in WisiToken.Syntax_Trees.Valid_Node_Index_Array)
is
Parse_Data : Wisi.Parse_Data_Type renames Wisi.Parse_Data_Type (User_Data);
begin
case Parse_Data.Post_Parse_Action is
when Navigate =>
null;
when Face =>
null;
when Indent =>
Indent_Action_0 (Parse_Data, Tree, Nonterm, Tokens, ((False, (Simple, (Int, 0))), (False, (Simple, (Int, 0))),
(True, (Simple, (Int, 0)), (Simple, (Int, 0)))));
end case;
end compilation_unit_0;
function identifier_opt_1_check
(Lexer : access constant WisiToken.Lexer.Instance'Class;
Nonterm : in out WisiToken.Recover_Token;
Tokens : in WisiToken.Recover_Token_Array;
Recover_Active : in Boolean)
return WisiToken.Semantic_Checks.Check_Status
is
pragma Unreferenced (Lexer, Recover_Active);
begin
return Propagate_Name (Nonterm, Tokens, 1);
end identifier_opt_1_check;
procedure package_spec_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_Index;
Tokens : in WisiToken.Syntax_Trees.Valid_Node_Index_Array)
is
Parse_Data : Wisi.Parse_Data_Type renames Wisi.Parse_Data_Type (User_Data);
begin
case Parse_Data.Post_Parse_Action is
when Navigate =>
Statement_Action (Parse_Data, Tree, Nonterm, Tokens, ((1, Statement_Start), (7, Statement_End)));
Containing_Action (Parse_Data, Tree, Nonterm, Tokens, 1, 4);
when Face =>
Face_Apply_Action (Parse_Data, Tree, Nonterm, Tokens, ((2, 1, 0), (6, 1, 0)));
when Indent =>
Indent_Action_0 (Parse_Data, Tree, Nonterm, Tokens, ((False, (Simple, (Int, 0))), (False, (Simple, (Int,
Gpr_Indent_Broken))), (False, (Simple, (Int, 0))), (True, (Simple, (Int, Gpr_Indent)), (Simple, (Int,
Gpr_Indent))), (False, (Simple, (Int, 0))), (False, (Simple, (Int, 0))), (False, (Simple, (Int, 0)))));
end case;
end package_spec_0;
function package_spec_0_check
(Lexer : access constant WisiToken.Lexer.Instance'Class;
Nonterm : in out WisiToken.Recover_Token;
Tokens : in WisiToken.Recover_Token_Array;
Recover_Active : in Boolean)
return WisiToken.Semantic_Checks.Check_Status
is
pragma Unreferenced (Nonterm, Recover_Active);
begin
return Match_Names (Lexer, Descriptor, Tokens, 2, 6, End_Names_Optional);
end package_spec_0_check;
procedure package_extension_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_Index;
Tokens : in WisiToken.Syntax_Trees.Valid_Node_Index_Array)
is
Parse_Data : Wisi.Parse_Data_Type renames Wisi.Parse_Data_Type (User_Data);
begin
case Parse_Data.Post_Parse_Action is
when Navigate =>
Statement_Action (Parse_Data, Tree, Nonterm, Tokens, ((1, Statement_Start), (9, Statement_End)));
Containing_Action (Parse_Data, Tree, Nonterm, Tokens, 1, 6);
when Face =>
Face_Apply_Action (Parse_Data, Tree, Nonterm, Tokens, ((2, 1, 0), (8, 1, 0)));
when Indent =>
Indent_Action_0 (Parse_Data, Tree, Nonterm, Tokens, ((False, (Simple, (Int, 0))), (False, (Simple, (Int,
Gpr_Indent_Broken))), (False, (Simple, (Int, 0))), (False, (Simple, (Int, Gpr_Indent_Broken))), (False,
(Simple, (Int, 0))), (True, (Simple, (Int, Gpr_Indent)), (Simple, (Int, Gpr_Indent))), (False, (Simple, (Int,
0))), (False, (Simple, (Int, 0))), (False, (Simple, (Int, 0)))));
end case;
end package_extension_0;
function package_extension_0_check
(Lexer : access constant WisiToken.Lexer.Instance'Class;
Nonterm : in out WisiToken.Recover_Token;
Tokens : in WisiToken.Recover_Token_Array;
Recover_Active : in Boolean)
return WisiToken.Semantic_Checks.Check_Status
is
pragma Unreferenced (Nonterm, Recover_Active);
begin
return Match_Names (Lexer, Descriptor, Tokens, 2, 8, End_Names_Optional);
end package_extension_0_check;
procedure package_renaming_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_Index;
Tokens : in WisiToken.Syntax_Trees.Valid_Node_Index_Array)
is
Parse_Data : Wisi.Parse_Data_Type renames Wisi.Parse_Data_Type (User_Data);
begin
case Parse_Data.Post_Parse_Action is
when Navigate =>
Statement_Action (Parse_Data, Tree, Nonterm, Tokens, ((1, Statement_Start), (5, Statement_End)));
when Face =>
Face_Apply_Action (Parse_Data, Tree, Nonterm, Tokens, ((2, 1, 0), (4, 1, 0)));
when Indent =>
null;
end case;
end package_renaming_0;
procedure project_extension_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_Index;
Tokens : in WisiToken.Syntax_Trees.Valid_Node_Index_Array)
is
Parse_Data : Wisi.Parse_Data_Type renames Wisi.Parse_Data_Type (User_Data);
begin
case Parse_Data.Post_Parse_Action is
when Navigate =>
Statement_Action (Parse_Data, Tree, Nonterm, Tokens, ((1, Statement_Start), (9, Statement_End)));
Containing_Action (Parse_Data, Tree, Nonterm, Tokens, 1, 6);
when Face =>
Face_Apply_Action (Parse_Data, Tree, Nonterm, Tokens, ((2, 1, 0), (8, 1, 0)));
when Indent =>
Indent_Action_0 (Parse_Data, Tree, Nonterm, Tokens, ((False, (Simple, (Int, 0))), (False, (Simple, (Int,
Gpr_Indent_Broken))), (False, (Simple, (Int, 0))), (False, (Simple, (Int, Gpr_Indent_Broken))), (False,
(Simple, (Int, 0))), (True, (Simple, (Int, Gpr_Indent)), (Simple, (Int, Gpr_Indent))), (False, (Simple, (Int,
0))), (False, (Simple, (Int, 0))), (False, (Simple, (Int, 0)))));
end case;
end project_extension_0;
function project_extension_0_check
(Lexer : access constant WisiToken.Lexer.Instance'Class;
Nonterm : in out WisiToken.Recover_Token;
Tokens : in WisiToken.Recover_Token_Array;
Recover_Active : in Boolean)
return WisiToken.Semantic_Checks.Check_Status
is
pragma Unreferenced (Nonterm, Recover_Active);
begin
return Match_Names (Lexer, Descriptor, Tokens, 2, 8, End_Names_Optional);
end project_extension_0_check;
procedure simple_declarative_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_Index;
Tokens : in WisiToken.Syntax_Trees.Valid_Node_Index_Array)
is
Parse_Data : Wisi.Parse_Data_Type renames Wisi.Parse_Data_Type (User_Data);
begin
case Parse_Data.Post_Parse_Action is
when Navigate =>
Statement_Action (Parse_Data, Tree, Nonterm, Tokens, ((1, Statement_Start), (4, Statement_End)));
when Face =>
null;
when Indent =>
Indent_Action_0 (Parse_Data, Tree, Nonterm, Tokens, ((False, (Simple, (Int, 0))), (False, (Simple, (Int,
Gpr_Indent_Broken))), (False, (Simple, (Int, Gpr_Indent_Broken))), (False, (Simple, (Int, 0)))));
end case;
end simple_declarative_item_0;
procedure simple_declarative_item_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_Index;
Tokens : in WisiToken.Syntax_Trees.Valid_Node_Index_Array)
is
Parse_Data : Wisi.Parse_Data_Type renames Wisi.Parse_Data_Type (User_Data);
begin
case Parse_Data.Post_Parse_Action is
when Navigate =>
Statement_Action (Parse_Data, Tree, Nonterm, Tokens, ((1, Statement_Start), (6, Statement_End)));
when Face =>
null;
when Indent =>
Indent_Action_0 (Parse_Data, Tree, Nonterm, Tokens, ((False, (Simple, (Int, 0))), (False, (Simple, (Int,
Gpr_Indent_Broken))), (False, (Simple, (Int, Gpr_Indent_Broken))), (False, (Simple, (Int,
Gpr_Indent_Broken))), (False, (Simple, (Int, Gpr_Indent_Broken))), (False, (Simple, (Int, 0)))));
end case;
end simple_declarative_item_1;
procedure simple_declarative_item_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_Index;
Tokens : in WisiToken.Syntax_Trees.Valid_Node_Index_Array)
is
Parse_Data : Wisi.Parse_Data_Type renames Wisi.Parse_Data_Type (User_Data);
begin
case Parse_Data.Post_Parse_Action is
when Navigate =>
Statement_Action (Parse_Data, Tree, Nonterm, Tokens, ((1, Statement_Start), (2, Statement_End)));
when Face =>
null;
when Indent =>
null;
end case;
end simple_declarative_item_4;
procedure simple_project_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_Index;
Tokens : in WisiToken.Syntax_Trees.Valid_Node_Index_Array)
is
Parse_Data : Wisi.Parse_Data_Type renames Wisi.Parse_Data_Type (User_Data);
begin
case Parse_Data.Post_Parse_Action is
when Navigate =>
Statement_Action (Parse_Data, Tree, Nonterm, Tokens, ((1, Statement_Start), (7, Statement_End)));
Containing_Action (Parse_Data, Tree, Nonterm, Tokens, 1, 4);
when Face =>
Face_Apply_Action (Parse_Data, Tree, Nonterm, Tokens, ((2, 1, 0), (6, 1, 0)));
when Indent =>
Indent_Action_0 (Parse_Data, Tree, Nonterm, Tokens, ((False, (Simple, (Int, 0))), (False, (Simple, (Int,
Gpr_Indent_Broken))), (False, (Simple, (Int, 0))), (True, (Simple, (Int, Gpr_Indent)), (Simple, (Int,
Gpr_Indent))), (False, (Simple, (Int, 0))), (False, (Simple, (Int, 0))), (False, (Simple, (Int, 0)))));
end case;
end simple_project_declaration_0;
function simple_project_declaration_0_check
(Lexer : access constant WisiToken.Lexer.Instance'Class;
Nonterm : in out WisiToken.Recover_Token;
Tokens : in WisiToken.Recover_Token_Array;
Recover_Active : in Boolean)
return WisiToken.Semantic_Checks.Check_Status
is
pragma Unreferenced (Nonterm, Recover_Active);
begin
return Match_Names (Lexer, Descriptor, Tokens, 2, 6, End_Names_Optional);
end simple_project_declaration_0_check;
procedure typed_string_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_Index;
Tokens : in WisiToken.Syntax_Trees.Valid_Node_Index_Array)
is
Parse_Data : Wisi.Parse_Data_Type renames Wisi.Parse_Data_Type (User_Data);
begin
case Parse_Data.Post_Parse_Action is
when Navigate =>
Statement_Action (Parse_Data, Tree, Nonterm, Tokens, ((1, Statement_Start), (5, Statement_End)));
when Face =>
null;
when Indent =>
Indent_Action_0 (Parse_Data, Tree, Nonterm, Tokens, ((False, (Simple, (Int, 0))), (False, (Simple, (Int,
Gpr_Indent_Broken))), (False, (Simple, (Int, Gpr_Indent_Broken))), (False, (Simple, (Int,
Gpr_Indent_Broken))), (False, (Simple, (Int, 0)))));
end case;
end typed_string_declaration_0;
end Gpr_Process_Actions;
|
AdaCore/Ada_Drivers_Library | Ada | 2,956 | ads | ------------------------------------------------------------------------------
-- --
-- Copyright (C) 2016, AdaCore --
-- --
-- Redistribution and use in source and binary forms, with or without --
-- modification, are permitted provided that the following conditions are --
-- met: --
-- 1. Redistributions of source code must retain the above copyright --
-- notice, this list of conditions and the following disclaimer. --
-- 2. Redistributions in binary form must reproduce the above copyright --
-- notice, this list of conditions and the following disclaimer in --
-- the documentation and/or other materials provided with the --
-- distribution. --
-- 3. Neither the name of the copyright holder nor the names of its --
-- contributors may be used to endorse or promote products derived --
-- from this software without specific prior written permission. --
-- --
-- THIS SOFTWARE IS PROVIDED BY THE COPYRIGHT HOLDERS AND CONTRIBUTORS --
-- "AS IS" AND ANY EXPRESS OR IMPLIED WARRANTIES, INCLUDING, BUT NOT --
-- LIMITED TO, THE IMPLIED WARRANTIES OF MERCHANTABILITY AND FITNESS FOR --
-- A PARTICULAR PURPOSE ARE DISCLAIMED. IN NO EVENT SHALL THE COPYRIGHT --
-- HOLDER OR CONTRIBUTORS BE LIABLE FOR ANY DIRECT, INDIRECT, INCIDENTAL, --
-- SPECIAL, EXEMPLARY, OR CONSEQUENTIAL DAMAGES (INCLUDING, BUT NOT --
-- LIMITED TO, PROCUREMENT OF SUBSTITUTE GOODS OR SERVICES; LOSS OF USE, --
-- DATA, OR PROFITS; OR BUSINESS INTERRUPTION) HOWEVER CAUSED AND ON ANY --
-- THEORY OF LIABILITY, WHETHER IN CONTRACT, STRICT LIABILITY, OR TORT --
-- (INCLUDING NEGLIGENCE OR OTHERWISE) ARISING IN ANY WAY OUT OF THE USE --
-- OF THIS SOFTWARE, EVEN IF ADVISED OF THE POSSIBILITY OF SUCH DAMAGE. --
-- --
------------------------------------------------------------------------------
with HAL.Time;
package Ravenscar_Time is
function Delays return not null HAL.Time.Any_Delays;
private
type Ravenscar_Delays is new HAL.Time.Delays with null record;
overriding
procedure Delay_Microseconds (This : in out Ravenscar_Delays;
Us : Integer);
overriding
procedure Delay_Milliseconds (This : in out Ravenscar_Delays;
Ms : Integer);
overriding
procedure Delay_Seconds (This : in out Ravenscar_Delays;
S : Integer);
end Ravenscar_Time;
|
stcarrez/ada-util | Ada | 1,158 | ads | -----------------------------------------------------------------------
-- util-http-headers-tests - Unit tests for Headers
-- Copyright (C) 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.Http.Headers.Tests is
procedure Add_Tests (Suite : in Util.Tests.Access_Test_Suite);
type Test is new Util.Tests.Test with null record;
-- Test the Get_Accepted function.
procedure Test_Get_Accepted (T : in out Test);
end Util.Http.Headers.Tests;
|
dshadrin/AProxy | Ada | 279 | ads | ----------------------------------------
-- Copyright (C) 2019 Dmitriy Shadrin --
-- All rights reserved. --
----------------------------------------
package ConfigTree.SaxParser is
procedure Parse(root : in out ConfigTree.NodePtr);
end ConfigTree.SaxParser;
|
afrl-rq/OpenUxAS | Ada | 1,166 | ads | with Ada.Strings.Unbounded; use Ada.Strings.Unbounded;
with Common; use Common;
with LMCP_Messages; use LMCP_Messages;
with UxAS.Comms.LMCP_Object_Message_Sender_Pipes;
-- Package only concerned with message passing. It defines its own state,
-- named Mailbox here, which is not mixed with the state of the service.
package Waypoint_Plan_Manager_Communication with SPARK_Mode is
type Waypoint_Plan_Manager_Mailbox is limited private;
procedure Initialize
(This : out Waypoint_Plan_Manager_Mailbox;
Source_Group : String;
Unique_Id : Int64;
Entity_Id : UInt32;
Service_Id : UInt32);
procedure sendBroadcastMessage
(This : in out Waypoint_Plan_Manager_Mailbox;
Msg : Message_Root'Class);
private
pragma SPARK_Mode (Off);
use UxAS.Comms.LMCP_Object_Message_Sender_Pipes;
type Waypoint_Plan_Manager_Mailbox is tagged limited record
Message_Sender_Pipe : LMCP_Object_Message_Sender_Pipe;
Source_Group : Unbounded_String;
Unique_Entity_Send_Message_Id : Int64;
end record;
end Waypoint_Plan_Manager_Communication;
|
Fabien-Chouteau/GESTE | Ada | 57,648 | ads | package GESTE_Fonts.FreeSerifItalic12pt7b is
Font : constant Bitmap_Font_Ref;
private
FreeSerifItalic12pt7bBitmaps : aliased constant Font_Bitmap := (
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#C0#, 16#00#, 16#06#, 16#00#, 16#00#, 16#30#, 16#00#, 16#03#,
16#80#, 16#00#, 16#18#, 16#00#, 16#00#, 16#C0#, 16#00#, 16#04#, 16#00#,
16#00#, 16#20#, 16#00#, 16#02#, 16#00#, 16#00#, 16#10#, 16#00#, 16#00#,
16#80#, 16#00#, 16#08#, 16#00#, 16#00#, 16#00#, 16#00#, 16#06#, 16#00#,
16#00#, 16#30#, 16#00#, 16#01#, 16#80#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#01#, 16#98#, 16#00#, 16#0C#, 16#C0#, 16#00#, 16#C4#,
16#00#, 16#06#, 16#20#, 16#00#, 16#21#, 16#00#, 16#01#, 16#10#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#62#, 16#00#, 16#02#, 16#30#,
16#00#, 16#11#, 16#80#, 16#01#, 16#88#, 16#00#, 16#08#, 16#C0#, 16#03#,
16#FF#, 16#80#, 16#04#, 16#20#, 16#00#, 16#23#, 16#00#, 16#03#, 16#10#,
16#00#, 16#10#, 16#80#, 16#07#, 16#FF#, 16#00#, 16#0C#, 16#40#, 16#00#,
16#46#, 16#00#, 16#06#, 16#20#, 16#00#, 16#21#, 16#00#, 16#01#, 16#18#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#02#, 16#00#, 16#00#, 16#F8#, 16#00#,
16#0C#, 16#B0#, 16#00#, 16#C8#, 16#80#, 16#06#, 16#48#, 16#00#, 16#32#,
16#00#, 16#01#, 16#D0#, 16#00#, 16#07#, 16#80#, 16#00#, 16#1E#, 16#00#,
16#00#, 16#78#, 16#00#, 16#02#, 16#E0#, 16#00#, 16#23#, 16#00#, 16#11#,
16#18#, 16#00#, 16#88#, 16#C0#, 16#04#, 16#44#, 16#00#, 16#34#, 16#60#,
16#00#, 16#7C#, 16#00#, 16#01#, 16#00#, 16#00#, 16#08#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#04#, 16#00#,
16#F0#, 16#C0#, 16#0C#, 16#7E#, 16#00#, 16#C2#, 16#20#, 16#0E#, 16#12#,
16#00#, 16#61#, 16#10#, 16#03#, 16#09#, 16#00#, 16#18#, 16#48#, 16#00#,
16#C4#, 16#8F#, 16#03#, 16#CC#, 16#C4#, 16#00#, 16#4C#, 16#20#, 16#04#,
16#61#, 16#00#, 16#26#, 16#08#, 16#02#, 16#30#, 16#80#, 16#11#, 16#84#,
16#01#, 16#04#, 16#40#, 16#08#, 16#3C#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#07#, 16#00#, 16#00#, 16#4C#, 16#00#, 16#06#, 16#60#,
16#00#, 16#33#, 16#00#, 16#01#, 16#B0#, 16#00#, 16#0E#, 16#00#, 16#00#,
16#60#, 16#00#, 16#0F#, 16#1E#, 16#01#, 16#9C#, 16#60#, 16#18#, 16#62#,
16#01#, 16#83#, 16#20#, 16#0C#, 16#1F#, 16#00#, 16#60#, 16#70#, 16#03#,
16#03#, 16#80#, 16#1E#, 16#3E#, 16#00#, 16#3E#, 16#3E#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#01#, 16#80#, 16#00#, 16#0C#, 16#00#, 16#00#,
16#C0#, 16#00#, 16#06#, 16#00#, 16#00#, 16#20#, 16#00#, 16#01#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#40#, 16#00#, 16#02#,
16#00#, 16#00#, 16#20#, 16#00#, 16#02#, 16#00#, 16#00#, 16#30#, 16#00#,
16#03#, 16#00#, 16#00#, 16#18#, 16#00#, 16#00#, 16#C0#, 16#00#, 16#0C#,
16#00#, 16#00#, 16#60#, 16#00#, 16#03#, 16#00#, 16#00#, 16#18#, 16#00#,
16#00#, 16#C0#, 16#00#, 16#06#, 16#00#, 16#00#, 16#30#, 16#00#, 16#01#,
16#80#, 16#00#, 16#04#, 16#00#, 16#00#, 16#20#, 16#00#, 16#01#, 16#00#,
16#00#, 16#04#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#01#, 16#00#,
16#00#, 16#08#, 16#00#, 16#00#, 16#20#, 16#00#, 16#01#, 16#00#, 16#00#,
16#08#, 16#00#, 16#00#, 16#60#, 16#00#, 16#03#, 16#00#, 16#00#, 16#18#,
16#00#, 16#00#, 16#C0#, 16#00#, 16#06#, 16#00#, 16#00#, 16#30#, 16#00#,
16#01#, 16#80#, 16#00#, 16#18#, 16#00#, 16#00#, 16#C0#, 16#00#, 16#06#,
16#00#, 16#00#, 16#60#, 16#00#, 16#02#, 16#00#, 16#00#, 16#30#, 16#00#,
16#01#, 16#00#, 16#00#, 16#10#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#20#, 16#00#, 16#01#, 16#00#, 16#00#, 16#08#, 16#00#, 16#06#,
16#4C#, 16#00#, 16#0F#, 16#80#, 16#00#, 16#38#, 16#00#, 16#0E#, 16#B0#,
16#00#, 16#64#, 16#C0#, 16#00#, 16#20#, 16#00#, 16#01#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#18#, 16#00#,
16#00#, 16#C0#, 16#00#, 16#06#, 16#00#, 16#00#, 16#30#, 16#00#, 16#01#,
16#80#, 16#01#, 16#FF#, 16#E0#, 16#00#, 16#60#, 16#00#, 16#03#, 16#00#,
16#00#, 16#18#, 16#00#, 16#00#, 16#C0#, 16#00#, 16#06#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#06#, 16#00#, 16#00#, 16#30#, 16#00#, 16#01#, 16#80#,
16#00#, 16#04#, 16#00#, 16#00#, 16#40#, 16#00#, 16#04#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#03#, 16#F0#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#06#, 16#00#, 16#00#,
16#30#, 16#00#, 16#01#, 16#80#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#08#, 16#00#, 16#00#, 16#C0#, 16#00#, 16#04#, 16#00#,
16#00#, 16#60#, 16#00#, 16#06#, 16#00#, 16#00#, 16#30#, 16#00#, 16#03#,
16#00#, 16#00#, 16#10#, 16#00#, 16#01#, 16#80#, 16#00#, 16#08#, 16#00#,
16#00#, 16#C0#, 16#00#, 16#0C#, 16#00#, 16#00#, 16#60#, 16#00#, 16#06#,
16#00#, 16#00#, 16#20#, 16#00#, 16#03#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#0F#, 16#00#, 16#00#, 16#CC#, 16#00#, 16#0C#, 16#20#, 16#00#,
16#C1#, 16#80#, 16#0E#, 16#0C#, 16#00#, 16#60#, 16#60#, 16#03#, 16#03#,
16#00#, 16#38#, 16#18#, 16#01#, 16#81#, 16#C0#, 16#0C#, 16#0C#, 16#00#,
16#60#, 16#60#, 16#03#, 16#03#, 16#00#, 16#18#, 16#30#, 16#00#, 16#C1#,
16#80#, 16#06#, 16#18#, 16#00#, 16#11#, 16#80#, 16#00#, 16#78#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#03#, 16#00#, 16#00#, 16#F8#, 16#00#, 16#01#,
16#80#, 16#00#, 16#0C#, 16#00#, 16#00#, 16#60#, 16#00#, 16#03#, 16#00#,
16#00#, 16#30#, 16#00#, 16#01#, 16#80#, 16#00#, 16#0C#, 16#00#, 16#00#,
16#E0#, 16#00#, 16#06#, 16#00#, 16#00#, 16#30#, 16#00#, 16#01#, 16#80#,
16#00#, 16#18#, 16#00#, 16#00#, 16#C0#, 16#00#, 16#06#, 16#00#, 16#01#,
16#FC#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#07#, 16#80#, 16#00#, 16#CE#, 16#00#, 16#08#, 16#38#, 16#00#,
16#00#, 16#C0#, 16#00#, 16#06#, 16#00#, 16#00#, 16#60#, 16#00#, 16#03#,
16#00#, 16#00#, 16#30#, 16#00#, 16#03#, 16#00#, 16#00#, 16#30#, 16#00#,
16#03#, 16#00#, 16#00#, 16#30#, 16#00#, 16#03#, 16#00#, 16#00#, 16#10#,
16#20#, 16#01#, 16#FE#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#78#, 16#00#, 16#0C#, 16#60#, 16#00#, 16#03#, 16#00#, 16#00#,
16#18#, 16#00#, 16#01#, 16#80#, 16#00#, 16#30#, 16#00#, 16#0F#, 16#C0#,
16#00#, 16#0E#, 16#00#, 16#00#, 16#38#, 16#00#, 16#00#, 16#C0#, 16#00#,
16#06#, 16#00#, 16#00#, 16#30#, 16#00#, 16#01#, 16#00#, 16#00#, 16#10#,
16#00#, 16#71#, 16#80#, 16#01#, 16#F0#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#04#, 16#00#, 16#00#, 16#60#, 16#00#, 16#07#,
16#00#, 16#00#, 16#58#, 16#00#, 16#05#, 16#80#, 16#00#, 16#4C#, 16#00#,
16#04#, 16#60#, 16#00#, 16#63#, 16#00#, 16#06#, 16#30#, 16#00#, 16#61#,
16#80#, 16#06#, 16#0C#, 16#00#, 16#3F#, 16#F8#, 16#00#, 16#06#, 16#00#,
16#00#, 16#30#, 16#00#, 16#01#, 16#00#, 16#00#, 16#18#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#FE#, 16#00#, 16#04#, 16#00#,
16#00#, 16#40#, 16#00#, 16#03#, 16#00#, 16#00#, 16#3E#, 16#00#, 16#00#,
16#78#, 16#00#, 16#00#, 16#E0#, 16#00#, 16#03#, 16#00#, 16#00#, 16#18#,
16#00#, 16#00#, 16#C0#, 16#00#, 16#06#, 16#00#, 16#00#, 16#30#, 16#00#,
16#01#, 16#00#, 16#00#, 16#10#, 16#00#, 16#71#, 16#00#, 16#01#, 16#F0#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#E0#, 16#00#, 16#3C#, 16#00#,
16#03#, 16#80#, 16#00#, 16#70#, 16#00#, 16#07#, 16#00#, 16#00#, 16#30#,
16#00#, 16#03#, 16#F8#, 16#00#, 16#1C#, 16#60#, 16#01#, 16#C1#, 16#80#,
16#0C#, 16#0C#, 16#00#, 16#60#, 16#60#, 16#03#, 16#03#, 16#00#, 16#18#,
16#38#, 16#00#, 16#C1#, 16#80#, 16#06#, 16#0C#, 16#00#, 16#11#, 16#C0#,
16#00#, 16#78#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#03#,
16#FF#, 16#00#, 16#20#, 16#30#, 16#00#, 16#01#, 16#80#, 16#00#, 16#18#,
16#00#, 16#00#, 16#80#, 16#00#, 16#0C#, 16#00#, 16#00#, 16#C0#, 16#00#,
16#06#, 16#00#, 16#00#, 16#60#, 16#00#, 16#02#, 16#00#, 16#00#, 16#30#,
16#00#, 16#01#, 16#00#, 16#00#, 16#18#, 16#00#, 16#01#, 16#80#, 16#00#,
16#08#, 16#00#, 16#00#, 16#C0#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#1F#,
16#00#, 16#01#, 16#8C#, 16#00#, 16#08#, 16#30#, 16#00#, 16#C1#, 16#80#,
16#06#, 16#0C#, 16#00#, 16#18#, 16#40#, 16#00#, 16#EC#, 16#00#, 16#03#,
16#80#, 16#00#, 16#2E#, 16#00#, 16#06#, 16#38#, 16#00#, 16#60#, 16#C0#,
16#03#, 16#03#, 16#00#, 16#10#, 16#18#, 16#00#, 16#80#, 16#C0#, 16#06#,
16#0C#, 16#00#, 16#18#, 16#C0#, 16#00#, 16#7C#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#1E#, 16#00#, 16#01#, 16#8C#, 16#00#, 16#18#, 16#20#, 16#01#,
16#81#, 16#80#, 16#0C#, 16#0C#, 16#00#, 16#60#, 16#60#, 16#03#, 16#03#,
16#00#, 16#18#, 16#38#, 16#00#, 16#C1#, 16#80#, 16#07#, 16#1C#, 16#00#,
16#1F#, 16#E0#, 16#00#, 16#06#, 16#00#, 16#00#, 16#60#, 16#00#, 16#06#,
16#00#, 16#00#, 16#E0#, 16#00#, 16#1E#, 16#00#, 16#01#, 16#80#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#C0#, 16#00#, 16#0E#, 16#00#, 16#00#, 16#30#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#02#, 16#00#, 16#00#, 16#38#, 16#00#, 16#00#,
16#C0#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#C0#, 16#00#, 16#06#, 16#00#, 16#00#, 16#30#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#38#,
16#00#, 16#00#, 16#C0#, 16#00#, 16#06#, 16#00#, 16#00#, 16#20#, 16#00#,
16#02#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#30#, 16#00#, 16#07#, 16#80#, 16#00#, 16#E0#,
16#00#, 16#3C#, 16#00#, 16#07#, 16#80#, 16#00#, 16#70#, 16#00#, 16#03#,
16#C0#, 16#00#, 16#03#, 16#80#, 16#00#, 16#07#, 16#80#, 16#00#, 16#0F#,
16#00#, 16#00#, 16#1C#, 16#00#, 16#00#, 16#20#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#FF#, 16#F0#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#7F#, 16#F8#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#60#, 16#00#, 16#03#,
16#C0#, 16#00#, 16#03#, 16#80#, 16#00#, 16#07#, 16#80#, 16#00#, 16#0F#,
16#00#, 16#00#, 16#1C#, 16#00#, 16#01#, 16#E0#, 16#00#, 16#3C#, 16#00#,
16#0F#, 16#00#, 16#01#, 16#E0#, 16#00#, 16#1C#, 16#00#, 16#00#, 16#80#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#78#, 16#00#,
16#04#, 16#60#, 16#00#, 16#21#, 16#00#, 16#00#, 16#18#, 16#00#, 16#00#,
16#C0#, 16#00#, 16#0C#, 16#00#, 16#00#, 16#C0#, 16#00#, 16#0C#, 16#00#,
16#00#, 16#40#, 16#00#, 16#04#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#01#, 16#80#, 16#00#, 16#0E#, 16#00#,
16#00#, 16#60#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#3F#, 16#00#, 16#07#, 16#06#, 16#00#, 16#60#, 16#08#, 16#06#, 16#00#,
16#20#, 16#30#, 16#ED#, 16#83#, 16#0C#, 16#E4#, 16#18#, 16#46#, 16#20#,
16#C6#, 16#31#, 16#06#, 16#21#, 16#88#, 16#31#, 16#0C#, 16#41#, 16#98#,
16#C4#, 16#0C#, 16#6A#, 16#60#, 16#33#, 16#9C#, 16#00#, 16#C0#, 16#00#,
16#03#, 16#81#, 16#00#, 16#07#, 16#F0#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#20#, 16#00#, 16#03#, 16#00#,
16#00#, 16#38#, 16#00#, 16#02#, 16#C0#, 16#00#, 16#16#, 16#00#, 16#01#,
16#18#, 16#00#, 16#08#, 16#C0#, 16#00#, 16#86#, 16#00#, 16#04#, 16#30#,
16#00#, 16#7F#, 16#80#, 16#06#, 16#0E#, 16#00#, 16#20#, 16#70#, 16#02#,
16#01#, 16#80#, 16#30#, 16#0C#, 16#03#, 16#C1#, 16#F8#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#03#, 16#FE#, 16#00#, 16#07#, 16#1C#, 16#00#,
16#30#, 16#60#, 16#01#, 16#83#, 16#00#, 16#0C#, 16#18#, 16#00#, 16#E1#,
16#C0#, 16#06#, 16#1C#, 16#00#, 16#3F#, 16#00#, 16#03#, 16#8E#, 16#00#,
16#1C#, 16#38#, 16#00#, 16#C1#, 16#C0#, 16#06#, 16#0E#, 16#00#, 16#70#,
16#70#, 16#03#, 16#03#, 16#00#, 16#18#, 16#78#, 16#03#, 16#FF#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#1F#, 16#A0#, 16#03#,
16#87#, 16#00#, 16#70#, 16#18#, 16#03#, 16#00#, 16#80#, 16#30#, 16#00#,
16#03#, 16#80#, 16#00#, 16#18#, 16#00#, 16#01#, 16#C0#, 16#00#, 16#0E#,
16#00#, 16#00#, 16#70#, 16#00#, 16#03#, 16#80#, 16#00#, 16#1C#, 16#00#,
16#00#, 16#60#, 16#08#, 16#03#, 16#80#, 16#80#, 16#0E#, 16#18#, 16#00#,
16#1F#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#03#, 16#FF#,
16#00#, 16#07#, 16#0E#, 16#00#, 16#38#, 16#38#, 16#01#, 16#80#, 16#C0#,
16#0C#, 16#07#, 16#00#, 16#E0#, 16#38#, 16#06#, 16#01#, 16#C0#, 16#30#,
16#0E#, 16#03#, 16#80#, 16#70#, 16#1C#, 16#03#, 16#80#, 16#C0#, 16#38#,
16#06#, 16#01#, 16#C0#, 16#70#, 16#1C#, 16#03#, 16#01#, 16#C0#, 16#18#,
16#38#, 16#03#, 16#FF#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#03#, 16#FF#, 16#C0#, 16#07#, 16#06#, 16#00#, 16#30#, 16#10#, 16#01#,
16#80#, 16#80#, 16#0C#, 16#00#, 16#00#, 16#E1#, 16#00#, 16#06#, 16#10#,
16#00#, 16#3F#, 16#80#, 16#03#, 16#84#, 16#00#, 16#1C#, 16#40#, 16#00#,
16#C0#, 16#00#, 16#06#, 16#00#, 16#00#, 16#70#, 16#10#, 16#03#, 16#00#,
16#80#, 16#18#, 16#1C#, 16#03#, 16#FF#, 16#C0#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#03#, 16#FF#, 16#C0#, 16#07#, 16#06#, 16#00#, 16#30#,
16#10#, 16#01#, 16#80#, 16#80#, 16#0C#, 16#00#, 16#00#, 16#E1#, 16#00#,
16#06#, 16#10#, 16#00#, 16#3F#, 16#80#, 16#03#, 16#84#, 16#00#, 16#18#,
16#40#, 16#00#, 16#C0#, 16#00#, 16#06#, 16#00#, 16#00#, 16#70#, 16#00#,
16#03#, 16#00#, 16#00#, 16#18#, 16#00#, 16#03#, 16#F0#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#1F#, 16#10#, 16#03#, 16#87#,
16#00#, 16#30#, 16#18#, 16#03#, 16#00#, 16#40#, 16#30#, 16#02#, 16#03#,
16#80#, 16#00#, 16#1C#, 16#00#, 16#01#, 16#C0#, 16#00#, 16#0E#, 16#03#,
16#F0#, 16#70#, 16#0E#, 16#03#, 16#80#, 16#70#, 16#1C#, 16#03#, 16#80#,
16#60#, 16#18#, 16#03#, 16#80#, 16#C0#, 16#0E#, 16#0E#, 16#00#, 16#1F#,
16#C0#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#03#, 16#F8#, 16#FC#,
16#07#, 16#03#, 16#80#, 16#30#, 16#1C#, 16#01#, 16#80#, 16#C0#, 16#0C#,
16#06#, 16#00#, 16#E0#, 16#70#, 16#06#, 16#03#, 16#80#, 16#3F#, 16#F8#,
16#03#, 16#80#, 16#C0#, 16#18#, 16#0E#, 16#00#, 16#C0#, 16#60#, 16#06#,
16#03#, 16#00#, 16#70#, 16#38#, 16#03#, 16#01#, 16#C0#, 16#18#, 16#0C#,
16#03#, 16#F1#, 16#F8#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#03#,
16#F0#, 16#00#, 16#07#, 16#00#, 16#00#, 16#30#, 16#00#, 16#01#, 16#80#,
16#00#, 16#0C#, 16#00#, 16#00#, 16#E0#, 16#00#, 16#06#, 16#00#, 16#00#,
16#30#, 16#00#, 16#03#, 16#80#, 16#00#, 16#1C#, 16#00#, 16#00#, 16#C0#,
16#00#, 16#06#, 16#00#, 16#00#, 16#70#, 16#00#, 16#03#, 16#00#, 16#00#,
16#18#, 16#00#, 16#03#, 16#F0#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#7E#, 16#00#, 16#00#, 16#C0#, 16#00#, 16#06#, 16#00#,
16#00#, 16#70#, 16#00#, 16#03#, 16#00#, 16#00#, 16#18#, 16#00#, 16#01#,
16#C0#, 16#00#, 16#0E#, 16#00#, 16#00#, 16#60#, 16#00#, 16#03#, 16#00#,
16#00#, 16#38#, 16#00#, 16#01#, 16#80#, 16#00#, 16#0C#, 16#00#, 16#0C#,
16#E0#, 16#00#, 16#66#, 16#00#, 16#01#, 16#E0#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#03#, 16#F9#, 16#F0#, 16#07#, 16#07#, 16#00#,
16#30#, 16#20#, 16#01#, 16#86#, 16#00#, 16#0C#, 16#60#, 16#00#, 16#E4#,
16#00#, 16#06#, 16#C0#, 16#00#, 16#3E#, 16#00#, 16#03#, 16#B0#, 16#00#,
16#1D#, 16#C0#, 16#00#, 16#C6#, 16#00#, 16#06#, 16#38#, 16#00#, 16#70#,
16#E0#, 16#03#, 16#03#, 16#00#, 16#18#, 16#1C#, 16#03#, 16#F3#, 16#F8#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#03#, 16#F8#, 16#00#, 16#07#,
16#00#, 16#00#, 16#30#, 16#00#, 16#01#, 16#80#, 16#00#, 16#0C#, 16#00#,
16#00#, 16#E0#, 16#00#, 16#06#, 16#00#, 16#00#, 16#30#, 16#00#, 16#03#,
16#80#, 16#00#, 16#1C#, 16#00#, 16#00#, 16#C0#, 16#00#, 16#06#, 16#00#,
16#00#, 16#70#, 16#10#, 16#03#, 16#00#, 16#80#, 16#18#, 16#1C#, 16#03#,
16#FF#, 16#C0#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#01#, 16#E0#,
16#0F#, 16#07#, 16#00#, 16#F0#, 16#38#, 16#07#, 16#01#, 16#C0#, 16#58#,
16#0E#, 16#07#, 16#C0#, 16#B8#, 16#2E#, 16#05#, 16#C2#, 16#60#, 16#26#,
16#33#, 16#03#, 16#31#, 16#38#, 16#11#, 16#91#, 16#80#, 16#8D#, 16#8C#,
16#04#, 16#68#, 16#60#, 16#43#, 16#87#, 16#02#, 16#1C#, 16#30#, 16#30#,
16#C3#, 16#83#, 16#E4#, 16#7F#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#03#, 16#C0#, 16#F8#, 16#07#, 16#01#, 16#80#, 16#38#, 16#08#, 16#01#,
16#E0#, 16#C0#, 16#0B#, 16#04#, 16#00#, 16#98#, 16#20#, 16#04#, 16#E1#,
16#00#, 16#23#, 16#10#, 16#03#, 16#1C#, 16#80#, 16#10#, 16#64#, 16#00#,
16#83#, 16#20#, 16#04#, 16#0E#, 16#00#, 16#60#, 16#70#, 16#02#, 16#03#,
16#80#, 16#30#, 16#08#, 16#03#, 16#E0#, 16#40#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#1F#, 16#00#, 16#03#, 16#8E#, 16#00#, 16#30#,
16#30#, 16#03#, 16#00#, 16#C0#, 16#38#, 16#06#, 16#03#, 16#80#, 16#30#,
16#1C#, 16#03#, 16#81#, 16#C0#, 16#1C#, 16#0E#, 16#00#, 16#E0#, 16#70#,
16#06#, 16#03#, 16#00#, 16#70#, 16#18#, 16#03#, 16#00#, 16#E0#, 16#30#,
16#03#, 16#03#, 16#00#, 16#1C#, 16#30#, 16#00#, 16#3E#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#03#, 16#FE#, 16#00#, 16#07#, 16#1C#,
16#00#, 16#38#, 16#60#, 16#01#, 16#83#, 16#00#, 16#0C#, 16#18#, 16#00#,
16#E0#, 16#C0#, 16#06#, 16#0E#, 16#00#, 16#30#, 16#E0#, 16#03#, 16#FC#,
16#00#, 16#1C#, 16#00#, 16#00#, 16#C0#, 16#00#, 16#06#, 16#00#, 16#00#,
16#70#, 16#00#, 16#03#, 16#00#, 16#00#, 16#18#, 16#00#, 16#03#, 16#F0#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#1F#, 16#00#,
16#03#, 16#8C#, 16#00#, 16#30#, 16#30#, 16#03#, 16#00#, 16#C0#, 16#38#,
16#06#, 16#03#, 16#80#, 16#30#, 16#1C#, 16#01#, 16#80#, 16#C0#, 16#1C#,
16#0E#, 16#00#, 16#E0#, 16#70#, 16#07#, 16#03#, 16#80#, 16#70#, 16#18#,
16#03#, 16#00#, 16#C0#, 16#38#, 16#07#, 16#01#, 16#80#, 16#18#, 16#18#,
16#00#, 16#63#, 16#00#, 16#00#, 16#E0#, 16#00#, 16#08#, 16#00#, 16#01#,
16#F8#, 16#30#, 16#19#, 16#FE#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#03#,
16#FE#, 16#00#, 16#07#, 16#1C#, 16#00#, 16#30#, 16#60#, 16#01#, 16#83#,
16#00#, 16#0C#, 16#18#, 16#00#, 16#E1#, 16#C0#, 16#06#, 16#1C#, 16#00#,
16#3F#, 16#80#, 16#03#, 16#98#, 16#00#, 16#1C#, 16#C0#, 16#00#, 16#C7#,
16#00#, 16#06#, 16#18#, 16#00#, 16#70#, 16#E0#, 16#03#, 16#07#, 16#00#,
16#18#, 16#1C#, 16#03#, 16#F0#, 16#F0#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#F2#, 16#00#, 16#0C#, 16#60#, 16#00#, 16#C1#, 16#00#,
16#06#, 16#08#, 16#00#, 16#30#, 16#00#, 16#01#, 16#C0#, 16#00#, 16#07#,
16#00#, 16#00#, 16#1C#, 16#00#, 16#00#, 16#70#, 16#00#, 16#01#, 16#C0#,
16#00#, 16#0E#, 16#00#, 16#20#, 16#30#, 16#01#, 16#01#, 16#80#, 16#0C#,
16#18#, 16#00#, 16#71#, 16#C0#, 16#02#, 16#78#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#03#, 16#FF#, 16#E0#, 16#18#, 16#E3#, 16#00#,
16#86#, 16#10#, 16#08#, 16#30#, 16#00#, 16#03#, 16#80#, 16#00#, 16#1C#,
16#00#, 16#00#, 16#C0#, 16#00#, 16#06#, 16#00#, 16#00#, 16#70#, 16#00#,
16#03#, 16#00#, 16#00#, 16#18#, 16#00#, 16#00#, 16#C0#, 16#00#, 16#0E#,
16#00#, 16#00#, 16#60#, 16#00#, 16#07#, 16#00#, 16#00#, 16#FE#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#03#, 16#F8#, 16#7C#, 16#07#,
16#01#, 16#80#, 16#30#, 16#0C#, 16#01#, 16#80#, 16#40#, 16#0C#, 16#02#,
16#00#, 16#E0#, 16#10#, 16#06#, 16#01#, 16#00#, 16#30#, 16#08#, 16#03#,
16#80#, 16#40#, 16#1C#, 16#02#, 16#00#, 16#C0#, 16#20#, 16#06#, 16#01#,
16#00#, 16#30#, 16#18#, 16#01#, 16#80#, 16#80#, 16#06#, 16#18#, 16#00#,
16#1F#, 16#80#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#03#, 16#F0#,
16#F8#, 16#0E#, 16#01#, 16#80#, 16#30#, 16#08#, 16#01#, 16#80#, 16#80#,
16#0C#, 16#04#, 16#00#, 16#60#, 16#40#, 16#03#, 16#84#, 16#00#, 16#0C#,
16#20#, 16#00#, 16#62#, 16#00#, 16#03#, 16#10#, 16#00#, 16#19#, 16#00#,
16#00#, 16#D0#, 16#00#, 16#07#, 16#80#, 16#00#, 16#18#, 16#00#, 16#00#,
16#80#, 16#00#, 16#04#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#03#, 16#F7#, 16#E3#, 16#0E#, 16#0C#, 16#08#, 16#30#, 16#60#, 16#41#,
16#83#, 16#02#, 16#0C#, 16#18#, 16#20#, 16#61#, 16#E1#, 16#03#, 16#0F#,
16#10#, 16#1C#, 16#98#, 16#80#, 16#64#, 16#C8#, 16#03#, 16#46#, 16#40#,
16#1A#, 16#34#, 16#00#, 16#E1#, 16#A0#, 16#07#, 16#0E#, 16#00#, 16#30#,
16#60#, 16#01#, 16#83#, 16#00#, 16#08#, 16#10#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#03#, 16#F3#, 16#E0#, 16#0E#, 16#06#, 16#00#, 16#30#,
16#20#, 16#01#, 16#C2#, 16#00#, 16#06#, 16#20#, 16#00#, 16#32#, 16#00#,
16#01#, 16#E0#, 16#00#, 16#06#, 16#00#, 16#00#, 16#38#, 16#00#, 16#03#,
16#C0#, 16#00#, 16#37#, 16#00#, 16#03#, 16#18#, 16#00#, 16#30#, 16#C0#,
16#03#, 16#07#, 16#00#, 16#38#, 16#3C#, 16#03#, 16#E3#, 16#F0#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#03#, 16#F3#, 16#E0#, 16#0E#, 16#06#,
16#00#, 16#30#, 16#20#, 16#01#, 16#82#, 16#00#, 16#0E#, 16#30#, 16#00#,
16#31#, 16#00#, 16#01#, 16#90#, 16#00#, 16#0F#, 16#00#, 16#00#, 16#30#,
16#00#, 16#03#, 16#80#, 16#00#, 16#1C#, 16#00#, 16#00#, 16#C0#, 16#00#,
16#06#, 16#00#, 16#00#, 16#70#, 16#00#, 16#03#, 16#80#, 16#00#, 16#7F#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#03#, 16#FF#, 16#C0#,
16#10#, 16#1C#, 16#01#, 16#01#, 16#C0#, 16#08#, 16#0C#, 16#00#, 16#00#,
16#C0#, 16#00#, 16#0E#, 16#00#, 16#00#, 16#E0#, 16#00#, 16#0E#, 16#00#,
16#00#, 16#60#, 16#00#, 16#06#, 16#00#, 16#00#, 16#70#, 16#00#, 16#07#,
16#00#, 16#00#, 16#70#, 16#10#, 16#03#, 16#00#, 16#80#, 16#30#, 16#0C#,
16#03#, 16#FF#, 16#C0#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#F0#, 16#00#, 16#06#, 16#00#, 16#00#, 16#20#, 16#00#, 16#03#, 16#00#,
16#00#, 16#18#, 16#00#, 16#00#, 16#C0#, 16#00#, 16#04#, 16#00#, 16#00#,
16#60#, 16#00#, 16#03#, 16#00#, 16#00#, 16#18#, 16#00#, 16#00#, 16#80#,
16#00#, 16#04#, 16#00#, 16#00#, 16#60#, 16#00#, 16#03#, 16#00#, 16#00#,
16#18#, 16#00#, 16#00#, 16#80#, 16#00#, 16#0C#, 16#00#, 16#00#, 16#60#,
16#00#, 16#03#, 16#00#, 16#00#, 16#1E#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#03#, 16#00#, 16#00#, 16#18#, 16#00#, 16#00#, 16#40#, 16#00#,
16#03#, 16#00#, 16#00#, 16#08#, 16#00#, 16#00#, 16#60#, 16#00#, 16#03#,
16#00#, 16#00#, 16#0C#, 16#00#, 16#00#, 16#60#, 16#00#, 16#01#, 16#00#,
16#00#, 16#0C#, 16#00#, 16#00#, 16#20#, 16#00#, 16#01#, 16#80#, 16#00#,
16#0C#, 16#00#, 16#00#, 16#30#, 16#00#, 16#01#, 16#80#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#F0#, 16#00#, 16#01#, 16#80#, 16#00#,
16#0C#, 16#00#, 16#00#, 16#40#, 16#00#, 16#06#, 16#00#, 16#00#, 16#30#,
16#00#, 16#01#, 16#80#, 16#00#, 16#08#, 16#00#, 16#00#, 16#C0#, 16#00#,
16#06#, 16#00#, 16#00#, 16#30#, 16#00#, 16#01#, 16#00#, 16#00#, 16#18#,
16#00#, 16#00#, 16#C0#, 16#00#, 16#06#, 16#00#, 16#00#, 16#30#, 16#00#,
16#03#, 16#00#, 16#00#, 16#18#, 16#00#, 16#00#, 16#C0#, 16#00#, 16#3E#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#01#, 16#80#, 16#00#, 16#0E#,
16#00#, 16#00#, 16#F0#, 16#00#, 16#04#, 16#C0#, 16#00#, 16#66#, 16#00#,
16#02#, 16#18#, 16#00#, 16#30#, 16#C0#, 16#01#, 16#03#, 16#00#, 16#18#,
16#18#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#07#, 16#FF#, 16#80#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#03#, 16#00#, 16#00#, 16#1C#, 16#00#, 16#00#, 16#60#, 16#00#, 16#00#,
16#80#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#7E#, 16#00#,
16#06#, 16#70#, 16#00#, 16#61#, 16#80#, 16#06#, 16#08#, 16#00#, 16#30#,
16#C0#, 16#03#, 16#06#, 16#00#, 16#18#, 16#30#, 16#01#, 16#C3#, 16#00#,
16#0C#, 16#38#, 16#00#, 16#32#, 16#D0#, 16#01#, 16#E7#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#03#, 16#80#, 16#00#, 16#0C#, 16#00#,
16#00#, 16#60#, 16#00#, 16#02#, 16#00#, 16#00#, 16#30#, 16#00#, 16#01#,
16#9C#, 16#00#, 16#0F#, 16#30#, 16#00#, 16#61#, 16#80#, 16#07#, 16#0C#,
16#00#, 16#30#, 16#60#, 16#01#, 16#83#, 16#00#, 16#08#, 16#30#, 16#00#,
16#C1#, 16#80#, 16#06#, 16#18#, 16#00#, 16#31#, 16#80#, 16#01#, 16#F0#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#78#, 16#00#, 16#06#, 16#60#, 16#00#, 16#C3#, 16#00#,
16#06#, 16#00#, 16#00#, 16#60#, 16#00#, 16#03#, 16#00#, 16#00#, 16#18#,
16#00#, 16#00#, 16#C0#, 16#00#, 16#06#, 16#08#, 16#00#, 16#30#, 16#80#,
16#00#, 16#F8#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#0F#, 16#00#, 16#00#, 16#30#, 16#00#, 16#01#, 16#80#, 16#00#, 16#0C#,
16#00#, 16#00#, 16#40#, 16#00#, 16#3E#, 16#00#, 16#06#, 16#70#, 16#00#,
16#61#, 16#80#, 16#06#, 16#08#, 16#00#, 16#30#, 16#C0#, 16#03#, 16#06#,
16#00#, 16#18#, 16#20#, 16#01#, 16#C3#, 16#00#, 16#0E#, 16#38#, 16#00#,
16#32#, 16#D0#, 16#01#, 16#E7#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#38#, 16#00#, 16#06#,
16#60#, 16#00#, 16#63#, 16#00#, 16#06#, 16#10#, 16#00#, 16#71#, 16#00#,
16#03#, 16#70#, 16#00#, 16#1C#, 16#00#, 16#00#, 16#C0#, 16#00#, 16#06#,
16#08#, 16#00#, 16#30#, 16#80#, 16#00#, 16#F8#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#03#, 16#80#, 16#00#, 16#36#, 16#00#, 16#03#, 16#00#, 16#00#,
16#10#, 16#00#, 16#01#, 16#80#, 16#00#, 16#0C#, 16#00#, 16#01#, 16#F8#,
16#00#, 16#02#, 16#00#, 16#00#, 16#30#, 16#00#, 16#01#, 16#80#, 16#00#,
16#0C#, 16#00#, 16#00#, 16#60#, 16#00#, 16#02#, 16#00#, 16#00#, 16#30#,
16#00#, 16#01#, 16#80#, 16#00#, 16#0C#, 16#00#, 16#00#, 16#60#, 16#00#,
16#02#, 16#00#, 16#00#, 16#30#, 16#00#, 16#01#, 16#00#, 16#00#, 16#18#,
16#00#, 16#01#, 16#80#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#F0#, 16#00#, 16#0C#, 16#F0#, 16#00#, 16#C2#, 16#00#, 16#06#,
16#38#, 16#00#, 16#21#, 16#80#, 16#01#, 16#98#, 16#00#, 16#07#, 16#80#,
16#00#, 16#60#, 16#00#, 16#03#, 16#00#, 16#00#, 16#1F#, 16#00#, 16#01#,
16#3C#, 16#00#, 16#10#, 16#60#, 16#00#, 16#81#, 16#00#, 16#04#, 16#08#,
16#00#, 16#30#, 16#C0#, 16#00#, 16#F8#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#03#, 16#80#,
16#00#, 16#0C#, 16#00#, 16#00#, 16#60#, 16#00#, 16#03#, 16#00#, 16#00#,
16#30#, 16#00#, 16#01#, 16#8C#, 16#00#, 16#0D#, 16#B0#, 16#00#, 16#51#,
16#80#, 16#07#, 16#18#, 16#00#, 16#38#, 16#C0#, 16#01#, 16#86#, 16#00#,
16#0C#, 16#30#, 16#00#, 16#C3#, 16#00#, 16#06#, 16#1A#, 16#00#, 16#30#,
16#D0#, 16#01#, 16#07#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#01#, 16#80#, 16#00#, 16#0C#, 16#00#, 16#00#, 16#60#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#01#, 16#80#, 16#00#, 16#3C#, 16#00#,
16#00#, 16#60#, 16#00#, 16#06#, 16#00#, 16#00#, 16#30#, 16#00#, 16#01#,
16#80#, 16#00#, 16#0C#, 16#00#, 16#00#, 16#C0#, 16#00#, 16#06#, 16#00#,
16#00#, 16#34#, 16#00#, 16#01#, 16#C0#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#40#, 16#00#, 16#07#, 16#00#, 16#00#, 16#18#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#60#, 16#00#,
16#0F#, 16#00#, 16#00#, 16#18#, 16#00#, 16#01#, 16#80#, 16#00#, 16#0C#,
16#00#, 16#00#, 16#60#, 16#00#, 16#03#, 16#00#, 16#00#, 16#30#, 16#00#,
16#01#, 16#80#, 16#00#, 16#0C#, 16#00#, 16#00#, 16#60#, 16#00#, 16#06#,
16#00#, 16#00#, 16#30#, 16#00#, 16#01#, 16#00#, 16#00#, 16#18#, 16#00#,
16#01#, 16#80#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#03#, 16#80#, 16#00#, 16#0C#, 16#00#,
16#00#, 16#60#, 16#00#, 16#03#, 16#00#, 16#00#, 16#30#, 16#00#, 16#01#,
16#9E#, 16#00#, 16#0C#, 16#60#, 16#00#, 16#44#, 16#00#, 16#06#, 16#40#,
16#00#, 16#34#, 16#00#, 16#01#, 16#E0#, 16#00#, 16#0D#, 16#80#, 16#00#,
16#CC#, 16#00#, 16#06#, 16#20#, 16#00#, 16#31#, 16#A0#, 16#01#, 16#06#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#03#, 16#80#, 16#00#,
16#0C#, 16#00#, 16#00#, 16#60#, 16#00#, 16#03#, 16#00#, 16#00#, 16#30#,
16#00#, 16#01#, 16#80#, 16#00#, 16#0C#, 16#00#, 16#00#, 16#60#, 16#00#,
16#06#, 16#00#, 16#00#, 16#30#, 16#00#, 16#01#, 16#80#, 16#00#, 16#08#,
16#00#, 16#00#, 16#C0#, 16#00#, 16#06#, 16#80#, 16#00#, 16#34#, 16#00#,
16#01#, 16#C0#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#07#, 16#8C#, 16#70#, 16#0D#, 16#E5#, 16#80#,
16#D3#, 16#4C#, 16#07#, 16#1C#, 16#60#, 16#38#, 16#C3#, 16#01#, 16#86#,
16#30#, 16#18#, 16#61#, 16#80#, 16#C3#, 16#0C#, 16#06#, 16#18#, 16#48#,
16#30#, 16#86#, 16#83#, 16#0C#, 16#38#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#07#, 16#9C#, 16#00#, 16#0D#,
16#30#, 16#00#, 16#51#, 16#00#, 16#07#, 16#18#, 16#00#, 16#38#, 16#C0#,
16#01#, 16#86#, 16#00#, 16#0C#, 16#20#, 16#00#, 16#C3#, 16#00#, 16#06#,
16#1A#, 16#00#, 16#30#, 16#E0#, 16#03#, 16#06#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#7C#,
16#00#, 16#06#, 16#30#, 16#00#, 16#61#, 16#80#, 16#06#, 16#0C#, 16#00#,
16#60#, 16#60#, 16#03#, 16#03#, 16#00#, 16#18#, 16#30#, 16#00#, 16#C1#,
16#80#, 16#06#, 16#18#, 16#00#, 16#31#, 16#80#, 16#00#, 16#F0#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#07#, 16#9C#, 16#00#, 16#0F#, 16#70#, 16#00#, 16#61#, 16#80#, 16#07#,
16#0C#, 16#00#, 16#30#, 16#60#, 16#01#, 16#83#, 16#00#, 16#0C#, 16#30#,
16#00#, 16#C1#, 16#80#, 16#06#, 16#18#, 16#00#, 16#31#, 16#80#, 16#01#,
16#F0#, 16#00#, 16#18#, 16#00#, 16#00#, 16#C0#, 16#00#, 16#06#, 16#00#,
16#00#, 16#30#, 16#00#, 16#01#, 16#C0#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#38#, 16#00#, 16#06#, 16#30#, 16#00#, 16#61#,
16#80#, 16#06#, 16#0C#, 16#00#, 16#30#, 16#40#, 16#03#, 16#06#, 16#00#,
16#18#, 16#30#, 16#00#, 16#C3#, 16#80#, 16#0E#, 16#38#, 16#00#, 16#32#,
16#C0#, 16#01#, 16#E6#, 16#00#, 16#00#, 16#20#, 16#00#, 16#03#, 16#00#,
16#00#, 16#18#, 16#00#, 16#00#, 16#C0#, 16#00#, 16#3F#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#07#, 16#98#, 16#00#, 16#0F#, 16#C0#,
16#00#, 16#50#, 16#00#, 16#07#, 16#00#, 16#00#, 16#30#, 16#00#, 16#01#,
16#80#, 16#00#, 16#0C#, 16#00#, 16#00#, 16#C0#, 16#00#, 16#06#, 16#00#,
16#00#, 16#30#, 16#00#, 16#01#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#01#, 16#F0#, 16#00#,
16#18#, 16#80#, 16#00#, 16#C4#, 16#00#, 16#06#, 16#00#, 16#00#, 16#18#,
16#00#, 16#00#, 16#E0#, 16#00#, 16#03#, 16#80#, 16#01#, 16#0C#, 16#00#,
16#08#, 16#60#, 16#00#, 16#62#, 16#00#, 16#02#, 16#E0#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#01#, 16#00#, 16#00#, 16#30#, 16#00#, 16#07#,
16#E0#, 16#00#, 16#0C#, 16#00#, 16#00#, 16#40#, 16#00#, 16#06#, 16#00#,
16#00#, 16#30#, 16#00#, 16#01#, 16#80#, 16#00#, 16#08#, 16#00#, 16#00#,
16#C0#, 16#00#, 16#06#, 16#80#, 16#00#, 16#38#, 16#00#, 16#01#, 16#80#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#07#, 16#86#, 16#00#, 16#08#, 16#30#, 16#00#, 16#C3#, 16#00#,
16#06#, 16#18#, 16#00#, 16#31#, 16#C0#, 16#01#, 16#0E#, 16#00#, 16#18#,
16#E0#, 16#00#, 16#CB#, 16#00#, 16#06#, 16#5A#, 16#00#, 16#34#, 16#E0#,
16#01#, 16#C6#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#03#, 16#86#, 16#00#, 16#0C#, 16#30#, 16#00#,
16#60#, 16#80#, 16#03#, 16#08#, 16#00#, 16#08#, 16#40#, 16#00#, 16#44#,
16#00#, 16#03#, 16#40#, 16#00#, 16#1A#, 16#00#, 16#00#, 16#E0#, 16#00#,
16#06#, 16#00#, 16#00#, 16#20#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#01#, 16#80#, 16#30#, 16#3C#,
16#31#, 16#80#, 16#61#, 16#84#, 16#03#, 16#1C#, 16#20#, 16#19#, 16#61#,
16#00#, 16#CB#, 16#10#, 16#02#, 16#99#, 16#00#, 16#18#, 16#D0#, 16#00#,
16#C2#, 16#80#, 16#04#, 16#18#, 16#00#, 16#20#, 16#80#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#01#, 16#8C#,
16#00#, 16#36#, 16#B0#, 16#00#, 16#38#, 16#00#, 16#01#, 16#C0#, 16#00#,
16#0C#, 16#00#, 16#00#, 16#20#, 16#00#, 16#03#, 16#80#, 16#00#, 16#2C#,
16#00#, 16#01#, 16#64#, 16#00#, 16#11#, 16#40#, 16#03#, 16#0C#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#03#, 16#86#, 16#00#, 16#0C#, 16#30#, 16#00#, 16#30#, 16#80#, 16#01#,
16#84#, 16#00#, 16#0C#, 16#40#, 16#00#, 16#32#, 16#00#, 16#01#, 16#A0#,
16#00#, 16#0D#, 16#00#, 16#00#, 16#70#, 16#00#, 16#01#, 16#80#, 16#00#,
16#08#, 16#00#, 16#00#, 16#80#, 16#00#, 16#04#, 16#00#, 16#00#, 16#40#,
16#00#, 16#04#, 16#00#, 16#01#, 16#C0#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#03#, 16#F8#, 16#00#, 16#10#, 16#80#, 16#00#, 16#08#,
16#00#, 16#00#, 16#80#, 16#00#, 16#04#, 16#00#, 16#00#, 16#40#, 16#00#,
16#04#, 16#00#, 16#00#, 16#40#, 16#00#, 16#04#, 16#00#, 16#00#, 16#38#,
16#00#, 16#03#, 16#E0#, 16#00#, 16#03#, 16#B0#, 16#00#, 16#07#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#70#, 16#00#, 16#03#, 16#00#, 16#00#, 16#30#, 16#00#, 16#01#,
16#80#, 16#00#, 16#0C#, 16#00#, 16#00#, 16#40#, 16#00#, 16#06#, 16#00#,
16#00#, 16#30#, 16#00#, 16#01#, 16#00#, 16#00#, 16#30#, 16#00#, 16#00#,
16#80#, 16#00#, 16#06#, 16#00#, 16#00#, 16#20#, 16#00#, 16#03#, 16#00#,
16#00#, 16#18#, 16#00#, 16#00#, 16#C0#, 16#00#, 16#04#, 16#00#, 16#00#,
16#60#, 16#00#, 16#03#, 16#00#, 16#00#, 16#0C#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#02#, 16#00#, 16#00#, 16#10#, 16#00#, 16#00#, 16#80#,
16#00#, 16#04#, 16#00#, 16#00#, 16#20#, 16#00#, 16#01#, 16#00#, 16#00#,
16#08#, 16#00#, 16#00#, 16#40#, 16#00#, 16#02#, 16#00#, 16#00#, 16#10#,
16#00#, 16#00#, 16#80#, 16#00#, 16#04#, 16#00#, 16#00#, 16#20#, 16#00#,
16#01#, 16#00#, 16#00#, 16#08#, 16#00#, 16#00#, 16#40#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#1C#, 16#00#, 16#00#, 16#60#, 16#00#, 16#01#, 16#00#,
16#00#, 16#18#, 16#00#, 16#00#, 16#C0#, 16#00#, 16#06#, 16#00#, 16#00#,
16#20#, 16#00#, 16#03#, 16#00#, 16#00#, 16#18#, 16#00#, 16#00#, 16#C0#,
16#00#, 16#02#, 16#00#, 16#00#, 16#30#, 16#00#, 16#03#, 16#00#, 16#00#,
16#18#, 16#00#, 16#01#, 16#80#, 16#00#, 16#0C#, 16#00#, 16#00#, 16#60#,
16#00#, 16#02#, 16#00#, 16#00#, 16#30#, 16#00#, 16#01#, 16#80#, 16#00#,
16#18#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#3C#, 16#00#, 16#03#, 16#11#, 16#80#, 16#00#,
16#78#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#);
Font_D : aliased constant Bitmap_Font :=
(
Bytes_Per_Glyph => 74,
Glyph_Width => 21,
Glyph_Height => 28,
Data => FreeSerifItalic12pt7bBitmaps'Access);
Font : constant Bitmap_Font_Ref := Font_D'Access;
end GESTE_Fonts.FreeSerifItalic12pt7b;
|
emacsmirror/ada-mode | Ada | 744,944 | adb | -- 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 SAL;
with Wisi; use Wisi;
with Wisi.Ada; use Wisi.Ada;
with WisiToken.In_Parse_Actions; use WisiToken.In_Parse_Actions;
package body Ada_Annex_P_Process_Actions is
use WisiToken.Syntax_Trees.In_Parse_Actions;
use all type Motion_Param_Array;
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)
is
Parse_Data : Wisi.Parse_Data_Type renames Wisi.Parse_Data_Type (User_Data);
begin
case Parse_Data.Post_Parse_Action is
when Navigate =>
null;
when Face =>
null;
when Indent =>
Indent_Action_0 (Parse_Data, Tree, Nonterm, (1 => (False, (Hanging_0, (Label => None), (Int,
Ada_Indent_Broken)))));
end case;
end pragma_argument_association_list_0;
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)
is
Parse_Data : Wisi.Parse_Data_Type renames Wisi.Parse_Data_Type (User_Data);
T1 : constant SAL.Peek_Type := 1;
T2 : constant SAL.Peek_Type := 2;
T3 : constant SAL.Peek_Type := 3;
begin
case Parse_Data.Post_Parse_Action is
when Navigate =>
null;
when Face =>
null;
when Indent =>
Indent_Action_0 (Parse_Data, Tree, Nonterm, (T1 => (False, (Simple, (Label => None))), T2 => (False, (Simple,
(Label => None))), T3 => (False, (Hanging_0, (Label => None), (Int, Ada_Indent_Broken)))));
end case;
end pragma_argument_association_list_1;
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)
is
Parse_Data : Wisi.Parse_Data_Type renames Wisi.Parse_Data_Type (User_Data);
T1 : constant SAL.Peek_Type := 1;
T2 : constant SAL.Peek_Type := 2;
T3 : constant SAL.Peek_Type := 3;
T4 : constant SAL.Peek_Type := 4;
T5 : constant SAL.Peek_Type := 5;
T6 : constant SAL.Peek_Type := 6;
begin
case Parse_Data.Post_Parse_Action is
when Navigate =>
Statement_Action (Parse_Data, Tree, Nonterm, ((T1, Statement_Start), (T6, Statement_End)));
when Face =>
Face_Apply_Action (Parse_Data, Tree, Nonterm, (1 => (T2, 3, 1)));
when Indent =>
Indent_Action_0 (Parse_Data, Tree, Nonterm, (T1 => (False, (Simple, (Label => None))), T2 => (False, (Simple,
(Int, Ada_Indent_Broken))), T3 => (False, (Simple, (Int, Ada_Indent_Broken))), T4 => (False, (Simple,
(Anchored_0, T3, 1))), T5 => (False, (Simple, (Anchored_0, T3, 0))), T6 => (False, (Simple, (Int,
Ada_Indent_Broken)))));
end case;
end pragma_g_0;
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)
is
Parse_Data : Wisi.Parse_Data_Type renames Wisi.Parse_Data_Type (User_Data);
T1 : constant SAL.Peek_Type := 1;
T2 : constant SAL.Peek_Type := 2;
T6 : constant SAL.Peek_Type := 3;
begin
case Parse_Data.Post_Parse_Action is
when Navigate =>
Statement_Action (Parse_Data, Tree, Nonterm, ((T1, Statement_Start), (T6, Statement_End)));
when Face =>
Face_Apply_Action (Parse_Data, Tree, Nonterm, (1 => (T2, 3, 1)));
when Indent =>
Indent_Action_0 (Parse_Data, Tree, Nonterm, (T1 => (False, (Simple, (Label => None))), T2 => (False, (Simple,
(Int, Ada_Indent_Broken))), T6 => (False, (Simple, (Int, Ada_Indent_Broken)))));
end case;
end pragma_g_1;
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)
is
Parse_Data : Wisi.Parse_Data_Type renames Wisi.Parse_Data_Type (User_Data);
T1 : constant SAL.Peek_Type := 1;
T2 : constant SAL.Peek_Type := 2;
T3 : constant SAL.Peek_Type := 3;
T4 : constant SAL.Peek_Type := 4;
T5 : constant SAL.Peek_Type := 5;
T6 : constant SAL.Peek_Type := 6;
begin
case Parse_Data.Post_Parse_Action is
when Navigate =>
Statement_Action (Parse_Data, Tree, Nonterm, ((T1, Statement_Start), (T6, Statement_End)));
when Face =>
Face_Apply_Action (Parse_Data, Tree, Nonterm, (1 => (T2, 3, 1)));
when Indent =>
Indent_Action_0 (Parse_Data, Tree, Nonterm, (T1 => (False, (Simple, (Label => None))), T2 => (False, (Simple,
(Int, Ada_Indent_Broken))), T3 => (False, (Simple, (Int, Ada_Indent_Broken))), T4 => (False, (Simple,
(Anchored_0, T3, 1))), T5 => (False, (Simple, (Anchored_0, T3, 0))), T6 => (False, (Simple, (Int,
Ada_Indent_Broken)))));
end case;
end pragma_g_2;
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)
is
Parse_Data : Wisi.Parse_Data_Type renames Wisi.Parse_Data_Type (User_Data);
T1 : constant SAL.Peek_Type := 1;
T2 : constant SAL.Peek_Type := 2;
T6 : constant SAL.Peek_Type := 3;
begin
case Parse_Data.Post_Parse_Action is
when Navigate =>
Statement_Action (Parse_Data, Tree, Nonterm, ((T1, Statement_Start), (T6, Statement_End)));
when Face =>
Face_Apply_Action (Parse_Data, Tree, Nonterm, (1 => (T2, 3, 1)));
when Indent =>
Indent_Action_0 (Parse_Data, Tree, Nonterm, (T1 => (False, (Simple, (Label => None))), T2 => (False, (Simple,
(Int, Ada_Indent_Broken))), T6 => (False, (Simple, (Int, Ada_Indent_Broken)))));
end case;
end pragma_g_3;
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)
is
Parse_Data : Wisi.Parse_Data_Type renames Wisi.Parse_Data_Type (User_Data);
T1 : constant SAL.Peek_Type := 1;
T2 : constant SAL.Peek_Type := 2;
T3 : constant SAL.Peek_Type := 3;
T4 : constant SAL.Peek_Type := 4;
T5 : constant SAL.Peek_Type := 5;
T6 : constant SAL.Peek_Type := 6;
T7 : constant SAL.Peek_Type := 7;
begin
case Parse_Data.Post_Parse_Action is
when Navigate =>
Statement_Action (Parse_Data, Tree, Nonterm, ((T1, Statement_Start), (T7, Statement_End)));
Name_Action (Parse_Data, Tree, Nonterm, T2);
when Face =>
Face_Apply_Action (Parse_Data, Tree, Nonterm, (1 => (T2, 3, 2)));
when Indent =>
Indent_Action_0 (Parse_Data, Tree, Nonterm, (T1 => (False, (Simple, (Label => None))), T2 => (False, (Simple,
(Int, Ada_Indent_Broken))), T3 => (False, (Simple, (Int, Ada_Indent_Broken))), T4 => (True, (Simple, (Int,
Ada_Indent_Broken)), (Simple, (Language, Ada_Indent_Record_1'Access, 83 & Integer (T5) & Ada_Indent_Broken))),
T5 => (False, (Hanging_1, (Int, Ada_Indent_Broken), (Int, 2 * Ada_Indent_Broken))), T6 => (False, (Simple,
(Label => None))), T7 => (False, (Simple, (Int, Ada_Indent_Broken)))));
end case;
end full_type_declaration_0;
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)
is
Parse_Data : Wisi.Parse_Data_Type renames Wisi.Parse_Data_Type (User_Data);
T1 : constant SAL.Peek_Type := 1;
T2 : constant SAL.Peek_Type := 2;
T3 : constant SAL.Peek_Type := 3;
T4 : constant SAL.Peek_Type := 4;
T5 : constant SAL.Peek_Type := 5;
T7 : constant SAL.Peek_Type := 6;
begin
case Parse_Data.Post_Parse_Action is
when Navigate =>
Statement_Action (Parse_Data, Tree, Nonterm, ((T1, Statement_Start), (T7, Statement_End)));
Name_Action (Parse_Data, Tree, Nonterm, T2);
when Face =>
Face_Apply_Action (Parse_Data, Tree, Nonterm, (1 => (T2, 3, 2)));
when Indent =>
Indent_Action_0 (Parse_Data, Tree, Nonterm, (T1 => (False, (Simple, (Label => None))), T2 => (False, (Simple,
(Int, Ada_Indent_Broken))), T3 => (False, (Simple, (Int, Ada_Indent_Broken))), T4 => (True, (Simple, (Int,
Ada_Indent_Broken)), (Simple, (Language, Ada_Indent_Record_1'Access, 83 & Integer (T5) & Ada_Indent_Broken))),
T5 => (False, (Hanging_1, (Int, Ada_Indent_Broken), (Int, 2 * Ada_Indent_Broken))), T7 => (False, (Simple,
(Int, Ada_Indent_Broken)))));
end case;
end full_type_declaration_1;
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)
is
Parse_Data : Wisi.Parse_Data_Type renames Wisi.Parse_Data_Type (User_Data);
T1 : constant SAL.Peek_Type := 1;
T2 : constant SAL.Peek_Type := 2;
T4 : constant SAL.Peek_Type := 3;
T5 : constant SAL.Peek_Type := 4;
T6 : constant SAL.Peek_Type := 5;
T7 : constant SAL.Peek_Type := 6;
begin
case Parse_Data.Post_Parse_Action is
when Navigate =>
Statement_Action (Parse_Data, Tree, Nonterm, ((T1, Statement_Start), (T7, Statement_End)));
Name_Action (Parse_Data, Tree, Nonterm, T2);
when Face =>
Face_Apply_Action (Parse_Data, Tree, Nonterm, (1 => (T2, 3, 2)));
when Indent =>
Indent_Action_0 (Parse_Data, Tree, Nonterm, (T1 => (False, (Simple, (Label => None))), T2 => (False, (Simple,
(Int, Ada_Indent_Broken))), T4 => (True, (Simple, (Int, Ada_Indent_Broken)), (Simple, (Language,
Ada_Indent_Record_1'Access, 83 & Integer (T5) & Ada_Indent_Broken))), T5 => (False, (Hanging_1, (Int,
Ada_Indent_Broken), (Int, 2 * Ada_Indent_Broken))), T6 => (False, (Simple, (Label => None))), T7 => (False,
(Simple, (Int, Ada_Indent_Broken)))));
end case;
end full_type_declaration_2;
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)
is
Parse_Data : Wisi.Parse_Data_Type renames Wisi.Parse_Data_Type (User_Data);
T1 : constant SAL.Peek_Type := 1;
T2 : constant SAL.Peek_Type := 2;
T4 : constant SAL.Peek_Type := 3;
T5 : constant SAL.Peek_Type := 4;
T7 : constant SAL.Peek_Type := 5;
begin
case Parse_Data.Post_Parse_Action is
when Navigate =>
Statement_Action (Parse_Data, Tree, Nonterm, ((T1, Statement_Start), (T7, Statement_End)));
Name_Action (Parse_Data, Tree, Nonterm, T2);
when Face =>
Face_Apply_Action (Parse_Data, Tree, Nonterm, (1 => (T2, 3, 2)));
when Indent =>
Indent_Action_0 (Parse_Data, Tree, Nonterm, (T1 => (False, (Simple, (Label => None))), T2 => (False, (Simple,
(Int, Ada_Indent_Broken))), T4 => (True, (Simple, (Int, Ada_Indent_Broken)), (Simple, (Language,
Ada_Indent_Record_1'Access, 83 & Integer (T5) & Ada_Indent_Broken))), T5 => (False, (Hanging_1, (Int,
Ada_Indent_Broken), (Int, 2 * Ada_Indent_Broken))), T7 => (False, (Simple, (Int, Ada_Indent_Broken)))));
end case;
end full_type_declaration_3;
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)
is
Parse_Data : Wisi.Parse_Data_Type renames Wisi.Parse_Data_Type (User_Data);
T1 : constant SAL.Peek_Type := 1;
T2 : constant SAL.Peek_Type := 2;
T3 : constant SAL.Peek_Type := 3;
T4 : constant SAL.Peek_Type := 4;
T5 : constant SAL.Peek_Type := 5;
T6 : constant SAL.Peek_Type := 6;
begin
case Parse_Data.Post_Parse_Action is
when Navigate =>
Statement_Action (Parse_Data, Tree, Nonterm, ((T1, Statement_Start), (T6, Statement_End)));
Name_Action (Parse_Data, Tree, Nonterm, T2);
when Face =>
Face_Apply_Action (Parse_Data, Tree, Nonterm, (1 => (T2, 3, 2)));
when Indent =>
Indent_Action_0 (Parse_Data, Tree, Nonterm, (T1 => (False, (Simple, (Label => None))), T2 => (False, (Simple,
(Int, Ada_Indent_Broken))), T3 => (False, (Simple, (Int, Ada_Indent_Broken))), T4 => (False, (Hanging_2, (Int,
Ada_Indent_Broken), (Int, Ada_Indent_Broken))), T5 => (False, (Simple, (Label => None))), T6 => (False,
(Simple, (Int, Ada_Indent_Broken)))));
end case;
end subtype_declaration_0;
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)
is
Parse_Data : Wisi.Parse_Data_Type renames Wisi.Parse_Data_Type (User_Data);
T1 : constant SAL.Peek_Type := 1;
T2 : constant SAL.Peek_Type := 2;
T3 : constant SAL.Peek_Type := 3;
T4 : constant SAL.Peek_Type := 4;
T6 : constant SAL.Peek_Type := 5;
begin
case Parse_Data.Post_Parse_Action is
when Navigate =>
Statement_Action (Parse_Data, Tree, Nonterm, ((T1, Statement_Start), (T6, Statement_End)));
Name_Action (Parse_Data, Tree, Nonterm, T2);
when Face =>
Face_Apply_Action (Parse_Data, Tree, Nonterm, (1 => (T2, 3, 2)));
when Indent =>
Indent_Action_0 (Parse_Data, Tree, Nonterm, (T1 => (False, (Simple, (Label => None))), T2 => (False, (Simple,
(Int, Ada_Indent_Broken))), T3 => (False, (Simple, (Int, Ada_Indent_Broken))), T4 => (False, (Hanging_2, (Int,
Ada_Indent_Broken), (Int, Ada_Indent_Broken))), T6 => (False, (Simple, (Int, Ada_Indent_Broken)))));
end case;
end subtype_declaration_1;
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)
is
Parse_Data : Wisi.Parse_Data_Type renames Wisi.Parse_Data_Type (User_Data);
T1 : constant SAL.Peek_Type := 1;
T2 : constant SAL.Peek_Type := 2;
T3 : constant SAL.Peek_Type := 3;
T4 : constant SAL.Peek_Type := 4;
T5 : constant SAL.Peek_Type := 5;
T6 : constant SAL.Peek_Type := 6;
T7 : constant SAL.Peek_Type := 7;
T8 : constant SAL.Peek_Type := 8;
begin
case Parse_Data.Post_Parse_Action is
when Navigate =>
Statement_Action (Parse_Data, Tree, Nonterm, ((T1, Statement_Start), (T8, Statement_End)));
when Face =>
null;
when Indent =>
Indent_Action_0 (Parse_Data, Tree, Nonterm, (T1 => (False, (Simple, (Label => None))), T2 => (False, (Simple,
(Int, Ada_Indent_Broken))), T3 => (False, (Simple, (Int, Ada_Indent_Broken))), T4 => (False, (Simple, (Int,
Ada_Indent_Broken))), T5 => (False, (Hanging_2, (Int, Ada_Indent_Broken), (Int, Ada_Indent_Broken))), T6 =>
(False, (Hanging_1, (Anchored_1, T5, Ada_Indent_Broken), (Anchored_1, T5, 2 * Ada_Indent_Broken))), T7 =>
(False, (Simple, (Int, Ada_Indent_Broken))), T8 => (False, (Simple, (Int, Ada_Indent_Broken)))));
end case;
end object_declaration_0;
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)
is
Parse_Data : Wisi.Parse_Data_Type renames Wisi.Parse_Data_Type (User_Data);
T1 : constant SAL.Peek_Type := 1;
T2 : constant SAL.Peek_Type := 2;
T3 : constant SAL.Peek_Type := 3;
T4 : constant SAL.Peek_Type := 4;
T5 : constant SAL.Peek_Type := 5;
T6 : constant SAL.Peek_Type := 6;
T8 : constant SAL.Peek_Type := 7;
begin
case Parse_Data.Post_Parse_Action is
when Navigate =>
Statement_Action (Parse_Data, Tree, Nonterm, ((T1, Statement_Start), (T8, Statement_End)));
when Face =>
null;
when Indent =>
Indent_Action_0 (Parse_Data, Tree, Nonterm, (T1 => (False, (Simple, (Label => None))), T2 => (False, (Simple,
(Int, Ada_Indent_Broken))), T3 => (False, (Simple, (Int, Ada_Indent_Broken))), T4 => (False, (Simple, (Int,
Ada_Indent_Broken))), T5 => (False, (Hanging_2, (Int, Ada_Indent_Broken), (Int, Ada_Indent_Broken))), T6 =>
(False, (Hanging_1, (Anchored_1, T5, Ada_Indent_Broken), (Anchored_1, T5, 2 * Ada_Indent_Broken))), T8 =>
(False, (Simple, (Int, Ada_Indent_Broken)))));
end case;
end object_declaration_1;
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)
is
Parse_Data : Wisi.Parse_Data_Type renames Wisi.Parse_Data_Type (User_Data);
T1 : constant SAL.Peek_Type := 1;
T2 : constant SAL.Peek_Type := 2;
T3 : constant SAL.Peek_Type := 3;
T4 : constant SAL.Peek_Type := 4;
T5 : constant SAL.Peek_Type := 5;
T7 : constant SAL.Peek_Type := 6;
T8 : constant SAL.Peek_Type := 7;
begin
case Parse_Data.Post_Parse_Action is
when Navigate =>
Statement_Action (Parse_Data, Tree, Nonterm, ((T1, Statement_Start), (T8, Statement_End)));
when Face =>
null;
when Indent =>
Indent_Action_0 (Parse_Data, Tree, Nonterm, (T1 => (False, (Simple, (Label => None))), T2 => (False, (Simple,
(Int, Ada_Indent_Broken))), T3 => (False, (Simple, (Int, Ada_Indent_Broken))), T4 => (False, (Simple, (Int,
Ada_Indent_Broken))), T5 => (False, (Hanging_2, (Int, Ada_Indent_Broken), (Int, Ada_Indent_Broken))), T7 =>
(False, (Simple, (Int, Ada_Indent_Broken))), T8 => (False, (Simple, (Int, Ada_Indent_Broken)))));
end case;
end object_declaration_2;
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)
is
Parse_Data : Wisi.Parse_Data_Type renames Wisi.Parse_Data_Type (User_Data);
T1 : constant SAL.Peek_Type := 1;
T2 : constant SAL.Peek_Type := 2;
T3 : constant SAL.Peek_Type := 3;
T4 : constant SAL.Peek_Type := 4;
T5 : constant SAL.Peek_Type := 5;
T8 : constant SAL.Peek_Type := 6;
begin
case Parse_Data.Post_Parse_Action is
when Navigate =>
Statement_Action (Parse_Data, Tree, Nonterm, ((T1, Statement_Start), (T8, Statement_End)));
when Face =>
null;
when Indent =>
Indent_Action_0 (Parse_Data, Tree, Nonterm, (T1 => (False, (Simple, (Label => None))), T2 => (False, (Simple,
(Int, Ada_Indent_Broken))), T3 => (False, (Simple, (Int, Ada_Indent_Broken))), T4 => (False, (Simple, (Int,
Ada_Indent_Broken))), T5 => (False, (Hanging_2, (Int, Ada_Indent_Broken), (Int, Ada_Indent_Broken))), T8 =>
(False, (Simple, (Int, Ada_Indent_Broken)))));
end case;
end object_declaration_3;
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)
is
Parse_Data : Wisi.Parse_Data_Type renames Wisi.Parse_Data_Type (User_Data);
T1 : constant SAL.Peek_Type := 1;
T2 : constant SAL.Peek_Type := 2;
T3 : constant SAL.Peek_Type := 3;
T5 : constant SAL.Peek_Type := 4;
T6 : constant SAL.Peek_Type := 5;
T7 : constant SAL.Peek_Type := 6;
T8 : constant SAL.Peek_Type := 7;
begin
case Parse_Data.Post_Parse_Action is
when Navigate =>
Statement_Action (Parse_Data, Tree, Nonterm, ((T1, Statement_Start), (T8, Statement_End)));
when Face =>
null;
when Indent =>
Indent_Action_0 (Parse_Data, Tree, Nonterm, (T1 => (False, (Simple, (Label => None))), T2 => (False, (Simple,
(Int, Ada_Indent_Broken))), T3 => (False, (Simple, (Int, Ada_Indent_Broken))), T5 => (False, (Hanging_2, (Int,
Ada_Indent_Broken), (Int, Ada_Indent_Broken))), T6 => (False, (Hanging_1, (Anchored_1, T5, Ada_Indent_Broken),
(Anchored_1, T5, 2 * Ada_Indent_Broken))), T7 => (False, (Simple, (Int, Ada_Indent_Broken))), T8 => (False,
(Simple, (Int, Ada_Indent_Broken)))));
end case;
end object_declaration_4;
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)
is
Parse_Data : Wisi.Parse_Data_Type renames Wisi.Parse_Data_Type (User_Data);
T1 : constant SAL.Peek_Type := 1;
T2 : constant SAL.Peek_Type := 2;
T3 : constant SAL.Peek_Type := 3;
T5 : constant SAL.Peek_Type := 4;
T6 : constant SAL.Peek_Type := 5;
T8 : constant SAL.Peek_Type := 6;
begin
case Parse_Data.Post_Parse_Action is
when Navigate =>
Statement_Action (Parse_Data, Tree, Nonterm, ((T1, Statement_Start), (T8, Statement_End)));
when Face =>
null;
when Indent =>
Indent_Action_0 (Parse_Data, Tree, Nonterm, (T1 => (False, (Simple, (Label => None))), T2 => (False, (Simple,
(Int, Ada_Indent_Broken))), T3 => (False, (Simple, (Int, Ada_Indent_Broken))), T5 => (False, (Hanging_2, (Int,
Ada_Indent_Broken), (Int, Ada_Indent_Broken))), T6 => (False, (Hanging_1, (Anchored_1, T5, Ada_Indent_Broken),
(Anchored_1, T5, 2 * Ada_Indent_Broken))), T8 => (False, (Simple, (Int, Ada_Indent_Broken)))));
end case;
end object_declaration_5;
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)
is
Parse_Data : Wisi.Parse_Data_Type renames Wisi.Parse_Data_Type (User_Data);
T1 : constant SAL.Peek_Type := 1;
T2 : constant SAL.Peek_Type := 2;
T3 : constant SAL.Peek_Type := 3;
T5 : constant SAL.Peek_Type := 4;
T7 : constant SAL.Peek_Type := 5;
T8 : constant SAL.Peek_Type := 6;
begin
case Parse_Data.Post_Parse_Action is
when Navigate =>
Statement_Action (Parse_Data, Tree, Nonterm, ((T1, Statement_Start), (T8, Statement_End)));
when Face =>
null;
when Indent =>
Indent_Action_0 (Parse_Data, Tree, Nonterm, (T1 => (False, (Simple, (Label => None))), T2 => (False, (Simple,
(Int, Ada_Indent_Broken))), T3 => (False, (Simple, (Int, Ada_Indent_Broken))), T5 => (False, (Hanging_2, (Int,
Ada_Indent_Broken), (Int, Ada_Indent_Broken))), T7 => (False, (Simple, (Int, Ada_Indent_Broken))), T8 =>
(False, (Simple, (Int, Ada_Indent_Broken)))));
end case;
end object_declaration_6;
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)
is
Parse_Data : Wisi.Parse_Data_Type renames Wisi.Parse_Data_Type (User_Data);
T1 : constant SAL.Peek_Type := 1;
T2 : constant SAL.Peek_Type := 2;
T3 : constant SAL.Peek_Type := 3;
T5 : constant SAL.Peek_Type := 4;
T8 : constant SAL.Peek_Type := 5;
begin
case Parse_Data.Post_Parse_Action is
when Navigate =>
Statement_Action (Parse_Data, Tree, Nonterm, ((T1, Statement_Start), (T8, Statement_End)));
when Face =>
null;
when Indent =>
Indent_Action_0 (Parse_Data, Tree, Nonterm, (T1 => (False, (Simple, (Label => None))), T2 => (False, (Simple,
(Int, Ada_Indent_Broken))), T3 => (False, (Simple, (Int, Ada_Indent_Broken))), T5 => (False, (Hanging_2, (Int,
Ada_Indent_Broken), (Int, Ada_Indent_Broken))), T8 => (False, (Simple, (Int, Ada_Indent_Broken)))));
end case;
end object_declaration_7;
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)
is
Parse_Data : Wisi.Parse_Data_Type renames Wisi.Parse_Data_Type (User_Data);
T1 : constant SAL.Peek_Type := 1;
T2 : constant SAL.Peek_Type := 2;
T4 : constant SAL.Peek_Type := 3;
T5 : constant SAL.Peek_Type := 4;
T6 : constant SAL.Peek_Type := 5;
T7 : constant SAL.Peek_Type := 6;
T8 : constant SAL.Peek_Type := 7;
begin
case Parse_Data.Post_Parse_Action is
when Navigate =>
Statement_Action (Parse_Data, Tree, Nonterm, ((T1, Statement_Start), (T8, Statement_End)));
when Face =>
null;
when Indent =>
Indent_Action_0 (Parse_Data, Tree, Nonterm, (T1 => (False, (Simple, (Label => None))), T2 => (False, (Simple,
(Int, Ada_Indent_Broken))), T4 => (False, (Simple, (Int, Ada_Indent_Broken))), T5 => (False, (Hanging_2, (Int,
Ada_Indent_Broken), (Int, Ada_Indent_Broken))), T6 => (False, (Hanging_1, (Anchored_1, T5, Ada_Indent_Broken),
(Anchored_1, T5, 2 * Ada_Indent_Broken))), T7 => (False, (Simple, (Int, Ada_Indent_Broken))), T8 => (False,
(Simple, (Int, Ada_Indent_Broken)))));
end case;
end object_declaration_8;
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)
is
Parse_Data : Wisi.Parse_Data_Type renames Wisi.Parse_Data_Type (User_Data);
T1 : constant SAL.Peek_Type := 1;
T2 : constant SAL.Peek_Type := 2;
T4 : constant SAL.Peek_Type := 3;
T5 : constant SAL.Peek_Type := 4;
T6 : constant SAL.Peek_Type := 5;
T8 : constant SAL.Peek_Type := 6;
begin
case Parse_Data.Post_Parse_Action is
when Navigate =>
Statement_Action (Parse_Data, Tree, Nonterm, ((T1, Statement_Start), (T8, Statement_End)));
when Face =>
null;
when Indent =>
Indent_Action_0 (Parse_Data, Tree, Nonterm, (T1 => (False, (Simple, (Label => None))), T2 => (False, (Simple,
(Int, Ada_Indent_Broken))), T4 => (False, (Simple, (Int, Ada_Indent_Broken))), T5 => (False, (Hanging_2, (Int,
Ada_Indent_Broken), (Int, Ada_Indent_Broken))), T6 => (False, (Hanging_1, (Anchored_1, T5, Ada_Indent_Broken),
(Anchored_1, T5, 2 * Ada_Indent_Broken))), T8 => (False, (Simple, (Int, Ada_Indent_Broken)))));
end case;
end object_declaration_9;
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)
is
Parse_Data : Wisi.Parse_Data_Type renames Wisi.Parse_Data_Type (User_Data);
T1 : constant SAL.Peek_Type := 1;
T2 : constant SAL.Peek_Type := 2;
T4 : constant SAL.Peek_Type := 3;
T5 : constant SAL.Peek_Type := 4;
T7 : constant SAL.Peek_Type := 5;
T8 : constant SAL.Peek_Type := 6;
begin
case Parse_Data.Post_Parse_Action is
when Navigate =>
Statement_Action (Parse_Data, Tree, Nonterm, ((T1, Statement_Start), (T8, Statement_End)));
when Face =>
null;
when Indent =>
Indent_Action_0 (Parse_Data, Tree, Nonterm, (T1 => (False, (Simple, (Label => None))), T2 => (False, (Simple,
(Int, Ada_Indent_Broken))), T4 => (False, (Simple, (Int, Ada_Indent_Broken))), T5 => (False, (Hanging_2, (Int,
Ada_Indent_Broken), (Int, Ada_Indent_Broken))), T7 => (False, (Simple, (Int, Ada_Indent_Broken))), T8 =>
(False, (Simple, (Int, Ada_Indent_Broken)))));
end case;
end object_declaration_10;
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)
is
Parse_Data : Wisi.Parse_Data_Type renames Wisi.Parse_Data_Type (User_Data);
T1 : constant SAL.Peek_Type := 1;
T2 : constant SAL.Peek_Type := 2;
T4 : constant SAL.Peek_Type := 3;
T5 : constant SAL.Peek_Type := 4;
T8 : constant SAL.Peek_Type := 5;
begin
case Parse_Data.Post_Parse_Action is
when Navigate =>
Statement_Action (Parse_Data, Tree, Nonterm, ((T1, Statement_Start), (T8, Statement_End)));
when Face =>
null;
when Indent =>
Indent_Action_0 (Parse_Data, Tree, Nonterm, (T1 => (False, (Simple, (Label => None))), T2 => (False, (Simple,
(Int, Ada_Indent_Broken))), T4 => (False, (Simple, (Int, Ada_Indent_Broken))), T5 => (False, (Hanging_2, (Int,
Ada_Indent_Broken), (Int, Ada_Indent_Broken))), T8 => (False, (Simple, (Int, Ada_Indent_Broken)))));
end case;
end object_declaration_11;
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)
is
Parse_Data : Wisi.Parse_Data_Type renames Wisi.Parse_Data_Type (User_Data);
T1 : constant SAL.Peek_Type := 1;
T2 : constant SAL.Peek_Type := 2;
T5 : constant SAL.Peek_Type := 3;
T6 : constant SAL.Peek_Type := 4;
T7 : constant SAL.Peek_Type := 5;
T8 : constant SAL.Peek_Type := 6;
begin
case Parse_Data.Post_Parse_Action is
when Navigate =>
Statement_Action (Parse_Data, Tree, Nonterm, ((T1, Statement_Start), (T8, Statement_End)));
when Face =>
null;
when Indent =>
Indent_Action_0 (Parse_Data, Tree, Nonterm, (T1 => (False, (Simple, (Label => None))), T2 => (False, (Simple,
(Int, Ada_Indent_Broken))), T5 => (False, (Hanging_2, (Int, Ada_Indent_Broken), (Int, Ada_Indent_Broken))), T6
=> (False, (Hanging_1, (Anchored_1, T5, Ada_Indent_Broken), (Anchored_1, T5, 2 * Ada_Indent_Broken))), T7 =>
(False, (Simple, (Int, Ada_Indent_Broken))), T8 => (False, (Simple, (Int, Ada_Indent_Broken)))));
end case;
end object_declaration_12;
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)
is
Parse_Data : Wisi.Parse_Data_Type renames Wisi.Parse_Data_Type (User_Data);
T1 : constant SAL.Peek_Type := 1;
T2 : constant SAL.Peek_Type := 2;
T5 : constant SAL.Peek_Type := 3;
T6 : constant SAL.Peek_Type := 4;
T8 : constant SAL.Peek_Type := 5;
begin
case Parse_Data.Post_Parse_Action is
when Navigate =>
Statement_Action (Parse_Data, Tree, Nonterm, ((T1, Statement_Start), (T8, Statement_End)));
when Face =>
null;
when Indent =>
Indent_Action_0 (Parse_Data, Tree, Nonterm, (T1 => (False, (Simple, (Label => None))), T2 => (False, (Simple,
(Int, Ada_Indent_Broken))), T5 => (False, (Hanging_2, (Int, Ada_Indent_Broken), (Int, Ada_Indent_Broken))), T6
=> (False, (Hanging_1, (Anchored_1, T5, Ada_Indent_Broken), (Anchored_1, T5, 2 * Ada_Indent_Broken))), T8 =>
(False, (Simple, (Int, Ada_Indent_Broken)))));
end case;
end object_declaration_13;
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)
is
Parse_Data : Wisi.Parse_Data_Type renames Wisi.Parse_Data_Type (User_Data);
T1 : constant SAL.Peek_Type := 1;
T2 : constant SAL.Peek_Type := 2;
T5 : constant SAL.Peek_Type := 3;
T7 : constant SAL.Peek_Type := 4;
T8 : constant SAL.Peek_Type := 5;
begin
case Parse_Data.Post_Parse_Action is
when Navigate =>
Statement_Action (Parse_Data, Tree, Nonterm, ((T1, Statement_Start), (T8, Statement_End)));
when Face =>
null;
when Indent =>
Indent_Action_0 (Parse_Data, Tree, Nonterm, (T1 => (False, (Simple, (Label => None))), T2 => (False, (Simple,
(Int, Ada_Indent_Broken))), T5 => (False, (Hanging_2, (Int, Ada_Indent_Broken), (Int, Ada_Indent_Broken))), T7
=> (False, (Simple, (Int, Ada_Indent_Broken))), T8 => (False, (Simple, (Int, Ada_Indent_Broken)))));
end case;
end object_declaration_14;
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)
is
Parse_Data : Wisi.Parse_Data_Type renames Wisi.Parse_Data_Type (User_Data);
T1 : constant SAL.Peek_Type := 1;
T2 : constant SAL.Peek_Type := 2;
T5 : constant SAL.Peek_Type := 3;
T8 : constant SAL.Peek_Type := 4;
begin
case Parse_Data.Post_Parse_Action is
when Navigate =>
Statement_Action (Parse_Data, Tree, Nonterm, ((T1, Statement_Start), (T8, Statement_End)));
when Face =>
null;
when Indent =>
Indent_Action_0 (Parse_Data, Tree, Nonterm, (T1 => (False, (Simple, (Label => None))), T2 => (False, (Simple,
(Int, Ada_Indent_Broken))), T5 => (False, (Hanging_2, (Int, Ada_Indent_Broken), (Int, Ada_Indent_Broken))), T8
=> (False, (Simple, (Int, Ada_Indent_Broken)))));
end case;
end object_declaration_15;
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)
is
Parse_Data : Wisi.Parse_Data_Type renames Wisi.Parse_Data_Type (User_Data);
T1 : constant SAL.Peek_Type := 1;
T2 : constant SAL.Peek_Type := 2;
T3 : constant SAL.Peek_Type := 3;
T4 : constant SAL.Peek_Type := 4;
T5 : constant SAL.Peek_Type := 5;
T6 : constant SAL.Peek_Type := 6;
T7 : constant SAL.Peek_Type := 7;
T8 : constant SAL.Peek_Type := 8;
begin
case Parse_Data.Post_Parse_Action is
when Navigate =>
Statement_Action (Parse_Data, Tree, Nonterm, ((T1, Statement_Start), (T8, Statement_End)));
when Face =>
null;
when Indent =>
Indent_Action_0 (Parse_Data, Tree, Nonterm, (T1 => (False, (Simple, (Label => None))), T2 => (False, (Simple,
(Int, Ada_Indent_Broken))), T3 => (False, (Simple, (Int, Ada_Indent_Broken))), T4 => (False, (Simple, (Int,
Ada_Indent_Broken))), T5 => (False, (Hanging_2, (Int, Ada_Indent_Broken), (Int, Ada_Indent_Broken))), T6 =>
(False, (Hanging_1, (Anchored_1, T5, Ada_Indent_Broken), (Anchored_1, T5, 2 * Ada_Indent_Broken))), T7 =>
(False, (Simple, (Int, Ada_Indent_Broken))), T8 => (False, (Simple, (Int, Ada_Indent_Broken)))));
end case;
end object_declaration_16;
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)
is
Parse_Data : Wisi.Parse_Data_Type renames Wisi.Parse_Data_Type (User_Data);
T1 : constant SAL.Peek_Type := 1;
T2 : constant SAL.Peek_Type := 2;
T3 : constant SAL.Peek_Type := 3;
T4 : constant SAL.Peek_Type := 4;
T5 : constant SAL.Peek_Type := 5;
T6 : constant SAL.Peek_Type := 6;
T8 : constant SAL.Peek_Type := 7;
begin
case Parse_Data.Post_Parse_Action is
when Navigate =>
Statement_Action (Parse_Data, Tree, Nonterm, ((T1, Statement_Start), (T8, Statement_End)));
when Face =>
null;
when Indent =>
Indent_Action_0 (Parse_Data, Tree, Nonterm, (T1 => (False, (Simple, (Label => None))), T2 => (False, (Simple,
(Int, Ada_Indent_Broken))), T3 => (False, (Simple, (Int, Ada_Indent_Broken))), T4 => (False, (Simple, (Int,
Ada_Indent_Broken))), T5 => (False, (Hanging_2, (Int, Ada_Indent_Broken), (Int, Ada_Indent_Broken))), T6 =>
(False, (Hanging_1, (Anchored_1, T5, Ada_Indent_Broken), (Anchored_1, T5, 2 * Ada_Indent_Broken))), T8 =>
(False, (Simple, (Int, Ada_Indent_Broken)))));
end case;
end object_declaration_17;
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)
is
Parse_Data : Wisi.Parse_Data_Type renames Wisi.Parse_Data_Type (User_Data);
T1 : constant SAL.Peek_Type := 1;
T2 : constant SAL.Peek_Type := 2;
T3 : constant SAL.Peek_Type := 3;
T4 : constant SAL.Peek_Type := 4;
T5 : constant SAL.Peek_Type := 5;
T7 : constant SAL.Peek_Type := 6;
T8 : constant SAL.Peek_Type := 7;
begin
case Parse_Data.Post_Parse_Action is
when Navigate =>
Statement_Action (Parse_Data, Tree, Nonterm, ((T1, Statement_Start), (T8, Statement_End)));
when Face =>
null;
when Indent =>
Indent_Action_0 (Parse_Data, Tree, Nonterm, (T1 => (False, (Simple, (Label => None))), T2 => (False, (Simple,
(Int, Ada_Indent_Broken))), T3 => (False, (Simple, (Int, Ada_Indent_Broken))), T4 => (False, (Simple, (Int,
Ada_Indent_Broken))), T5 => (False, (Hanging_2, (Int, Ada_Indent_Broken), (Int, Ada_Indent_Broken))), T7 =>
(False, (Simple, (Int, Ada_Indent_Broken))), T8 => (False, (Simple, (Int, Ada_Indent_Broken)))));
end case;
end object_declaration_18;
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)
is
Parse_Data : Wisi.Parse_Data_Type renames Wisi.Parse_Data_Type (User_Data);
T1 : constant SAL.Peek_Type := 1;
T2 : constant SAL.Peek_Type := 2;
T3 : constant SAL.Peek_Type := 3;
T4 : constant SAL.Peek_Type := 4;
T5 : constant SAL.Peek_Type := 5;
T8 : constant SAL.Peek_Type := 6;
begin
case Parse_Data.Post_Parse_Action is
when Navigate =>
Statement_Action (Parse_Data, Tree, Nonterm, ((T1, Statement_Start), (T8, Statement_End)));
when Face =>
null;
when Indent =>
Indent_Action_0 (Parse_Data, Tree, Nonterm, (T1 => (False, (Simple, (Label => None))), T2 => (False, (Simple,
(Int, Ada_Indent_Broken))), T3 => (False, (Simple, (Int, Ada_Indent_Broken))), T4 => (False, (Simple, (Int,
Ada_Indent_Broken))), T5 => (False, (Hanging_2, (Int, Ada_Indent_Broken), (Int, Ada_Indent_Broken))), T8 =>
(False, (Simple, (Int, Ada_Indent_Broken)))));
end case;
end object_declaration_19;
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)
is
Parse_Data : Wisi.Parse_Data_Type renames Wisi.Parse_Data_Type (User_Data);
T1 : constant SAL.Peek_Type := 1;
T2 : constant SAL.Peek_Type := 2;
T3 : constant SAL.Peek_Type := 3;
T5 : constant SAL.Peek_Type := 4;
T6 : constant SAL.Peek_Type := 5;
T7 : constant SAL.Peek_Type := 6;
T8 : constant SAL.Peek_Type := 7;
begin
case Parse_Data.Post_Parse_Action is
when Navigate =>
Statement_Action (Parse_Data, Tree, Nonterm, ((T1, Statement_Start), (T8, Statement_End)));
when Face =>
null;
when Indent =>
Indent_Action_0 (Parse_Data, Tree, Nonterm, (T1 => (False, (Simple, (Label => None))), T2 => (False, (Simple,
(Int, Ada_Indent_Broken))), T3 => (False, (Simple, (Int, Ada_Indent_Broken))), T5 => (False, (Hanging_2, (Int,
Ada_Indent_Broken), (Int, Ada_Indent_Broken))), T6 => (False, (Hanging_1, (Anchored_1, T5, Ada_Indent_Broken),
(Anchored_1, T5, 2 * Ada_Indent_Broken))), T7 => (False, (Simple, (Int, Ada_Indent_Broken))), T8 => (False,
(Simple, (Int, Ada_Indent_Broken)))));
end case;
end object_declaration_20;
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)
is
Parse_Data : Wisi.Parse_Data_Type renames Wisi.Parse_Data_Type (User_Data);
T1 : constant SAL.Peek_Type := 1;
T2 : constant SAL.Peek_Type := 2;
T3 : constant SAL.Peek_Type := 3;
T5 : constant SAL.Peek_Type := 4;
T6 : constant SAL.Peek_Type := 5;
T8 : constant SAL.Peek_Type := 6;
begin
case Parse_Data.Post_Parse_Action is
when Navigate =>
Statement_Action (Parse_Data, Tree, Nonterm, ((T1, Statement_Start), (T8, Statement_End)));
when Face =>
null;
when Indent =>
Indent_Action_0 (Parse_Data, Tree, Nonterm, (T1 => (False, (Simple, (Label => None))), T2 => (False, (Simple,
(Int, Ada_Indent_Broken))), T3 => (False, (Simple, (Int, Ada_Indent_Broken))), T5 => (False, (Hanging_2, (Int,
Ada_Indent_Broken), (Int, Ada_Indent_Broken))), T6 => (False, (Hanging_1, (Anchored_1, T5, Ada_Indent_Broken),
(Anchored_1, T5, 2 * Ada_Indent_Broken))), T8 => (False, (Simple, (Int, Ada_Indent_Broken)))));
end case;
end object_declaration_21;
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)
is
Parse_Data : Wisi.Parse_Data_Type renames Wisi.Parse_Data_Type (User_Data);
T1 : constant SAL.Peek_Type := 1;
T2 : constant SAL.Peek_Type := 2;
T3 : constant SAL.Peek_Type := 3;
T5 : constant SAL.Peek_Type := 4;
T7 : constant SAL.Peek_Type := 5;
T8 : constant SAL.Peek_Type := 6;
begin
case Parse_Data.Post_Parse_Action is
when Navigate =>
Statement_Action (Parse_Data, Tree, Nonterm, ((T1, Statement_Start), (T8, Statement_End)));
when Face =>
null;
when Indent =>
Indent_Action_0 (Parse_Data, Tree, Nonterm, (T1 => (False, (Simple, (Label => None))), T2 => (False, (Simple,
(Int, Ada_Indent_Broken))), T3 => (False, (Simple, (Int, Ada_Indent_Broken))), T5 => (False, (Hanging_2, (Int,
Ada_Indent_Broken), (Int, Ada_Indent_Broken))), T7 => (False, (Simple, (Int, Ada_Indent_Broken))), T8 =>
(False, (Simple, (Int, Ada_Indent_Broken)))));
end case;
end object_declaration_22;
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)
is
Parse_Data : Wisi.Parse_Data_Type renames Wisi.Parse_Data_Type (User_Data);
T1 : constant SAL.Peek_Type := 1;
T2 : constant SAL.Peek_Type := 2;
T3 : constant SAL.Peek_Type := 3;
T5 : constant SAL.Peek_Type := 4;
T8 : constant SAL.Peek_Type := 5;
begin
case Parse_Data.Post_Parse_Action is
when Navigate =>
Statement_Action (Parse_Data, Tree, Nonterm, ((T1, Statement_Start), (T8, Statement_End)));
when Face =>
null;
when Indent =>
Indent_Action_0 (Parse_Data, Tree, Nonterm, (T1 => (False, (Simple, (Label => None))), T2 => (False, (Simple,
(Int, Ada_Indent_Broken))), T3 => (False, (Simple, (Int, Ada_Indent_Broken))), T5 => (False, (Hanging_2, (Int,
Ada_Indent_Broken), (Int, Ada_Indent_Broken))), T8 => (False, (Simple, (Int, Ada_Indent_Broken)))));
end case;
end object_declaration_23;
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)
is
Parse_Data : Wisi.Parse_Data_Type renames Wisi.Parse_Data_Type (User_Data);
T1 : constant SAL.Peek_Type := 1;
T2 : constant SAL.Peek_Type := 2;
T4 : constant SAL.Peek_Type := 3;
T5 : constant SAL.Peek_Type := 4;
T6 : constant SAL.Peek_Type := 5;
T7 : constant SAL.Peek_Type := 6;
T8 : constant SAL.Peek_Type := 7;
begin
case Parse_Data.Post_Parse_Action is
when Navigate =>
Statement_Action (Parse_Data, Tree, Nonterm, ((T1, Statement_Start), (T8, Statement_End)));
when Face =>
null;
when Indent =>
Indent_Action_0 (Parse_Data, Tree, Nonterm, (T1 => (False, (Simple, (Label => None))), T2 => (False, (Simple,
(Int, Ada_Indent_Broken))), T4 => (False, (Simple, (Int, Ada_Indent_Broken))), T5 => (False, (Hanging_2, (Int,
Ada_Indent_Broken), (Int, Ada_Indent_Broken))), T6 => (False, (Hanging_1, (Anchored_1, T5, Ada_Indent_Broken),
(Anchored_1, T5, 2 * Ada_Indent_Broken))), T7 => (False, (Simple, (Int, Ada_Indent_Broken))), T8 => (False,
(Simple, (Int, Ada_Indent_Broken)))));
end case;
end object_declaration_24;
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)
is
Parse_Data : Wisi.Parse_Data_Type renames Wisi.Parse_Data_Type (User_Data);
T1 : constant SAL.Peek_Type := 1;
T2 : constant SAL.Peek_Type := 2;
T4 : constant SAL.Peek_Type := 3;
T5 : constant SAL.Peek_Type := 4;
T6 : constant SAL.Peek_Type := 5;
T8 : constant SAL.Peek_Type := 6;
begin
case Parse_Data.Post_Parse_Action is
when Navigate =>
Statement_Action (Parse_Data, Tree, Nonterm, ((T1, Statement_Start), (T8, Statement_End)));
when Face =>
null;
when Indent =>
Indent_Action_0 (Parse_Data, Tree, Nonterm, (T1 => (False, (Simple, (Label => None))), T2 => (False, (Simple,
(Int, Ada_Indent_Broken))), T4 => (False, (Simple, (Int, Ada_Indent_Broken))), T5 => (False, (Hanging_2, (Int,
Ada_Indent_Broken), (Int, Ada_Indent_Broken))), T6 => (False, (Hanging_1, (Anchored_1, T5, Ada_Indent_Broken),
(Anchored_1, T5, 2 * Ada_Indent_Broken))), T8 => (False, (Simple, (Int, Ada_Indent_Broken)))));
end case;
end object_declaration_25;
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)
is
Parse_Data : Wisi.Parse_Data_Type renames Wisi.Parse_Data_Type (User_Data);
T1 : constant SAL.Peek_Type := 1;
T2 : constant SAL.Peek_Type := 2;
T4 : constant SAL.Peek_Type := 3;
T5 : constant SAL.Peek_Type := 4;
T7 : constant SAL.Peek_Type := 5;
T8 : constant SAL.Peek_Type := 6;
begin
case Parse_Data.Post_Parse_Action is
when Navigate =>
Statement_Action (Parse_Data, Tree, Nonterm, ((T1, Statement_Start), (T8, Statement_End)));
when Face =>
null;
when Indent =>
Indent_Action_0 (Parse_Data, Tree, Nonterm, (T1 => (False, (Simple, (Label => None))), T2 => (False, (Simple,
(Int, Ada_Indent_Broken))), T4 => (False, (Simple, (Int, Ada_Indent_Broken))), T5 => (False, (Hanging_2, (Int,
Ada_Indent_Broken), (Int, Ada_Indent_Broken))), T7 => (False, (Simple, (Int, Ada_Indent_Broken))), T8 =>
(False, (Simple, (Int, Ada_Indent_Broken)))));
end case;
end object_declaration_26;
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)
is
Parse_Data : Wisi.Parse_Data_Type renames Wisi.Parse_Data_Type (User_Data);
T1 : constant SAL.Peek_Type := 1;
T2 : constant SAL.Peek_Type := 2;
T4 : constant SAL.Peek_Type := 3;
T5 : constant SAL.Peek_Type := 4;
T8 : constant SAL.Peek_Type := 5;
begin
case Parse_Data.Post_Parse_Action is
when Navigate =>
Statement_Action (Parse_Data, Tree, Nonterm, ((T1, Statement_Start), (T8, Statement_End)));
when Face =>
null;
when Indent =>
Indent_Action_0 (Parse_Data, Tree, Nonterm, (T1 => (False, (Simple, (Label => None))), T2 => (False, (Simple,
(Int, Ada_Indent_Broken))), T4 => (False, (Simple, (Int, Ada_Indent_Broken))), T5 => (False, (Hanging_2, (Int,
Ada_Indent_Broken), (Int, Ada_Indent_Broken))), T8 => (False, (Simple, (Int, Ada_Indent_Broken)))));
end case;
end object_declaration_27;
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)
is
Parse_Data : Wisi.Parse_Data_Type renames Wisi.Parse_Data_Type (User_Data);
T1 : constant SAL.Peek_Type := 1;
T2 : constant SAL.Peek_Type := 2;
T5 : constant SAL.Peek_Type := 3;
T6 : constant SAL.Peek_Type := 4;
T7 : constant SAL.Peek_Type := 5;
T8 : constant SAL.Peek_Type := 6;
begin
case Parse_Data.Post_Parse_Action is
when Navigate =>
Statement_Action (Parse_Data, Tree, Nonterm, ((T1, Statement_Start), (T8, Statement_End)));
when Face =>
null;
when Indent =>
Indent_Action_0 (Parse_Data, Tree, Nonterm, (T1 => (False, (Simple, (Label => None))), T2 => (False, (Simple,
(Int, Ada_Indent_Broken))), T5 => (False, (Hanging_2, (Int, Ada_Indent_Broken), (Int, Ada_Indent_Broken))), T6
=> (False, (Hanging_1, (Anchored_1, T5, Ada_Indent_Broken), (Anchored_1, T5, 2 * Ada_Indent_Broken))), T7 =>
(False, (Simple, (Int, Ada_Indent_Broken))), T8 => (False, (Simple, (Int, Ada_Indent_Broken)))));
end case;
end object_declaration_28;
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)
is
Parse_Data : Wisi.Parse_Data_Type renames Wisi.Parse_Data_Type (User_Data);
T1 : constant SAL.Peek_Type := 1;
T2 : constant SAL.Peek_Type := 2;
T5 : constant SAL.Peek_Type := 3;
T6 : constant SAL.Peek_Type := 4;
T8 : constant SAL.Peek_Type := 5;
begin
case Parse_Data.Post_Parse_Action is
when Navigate =>
Statement_Action (Parse_Data, Tree, Nonterm, ((T1, Statement_Start), (T8, Statement_End)));
when Face =>
null;
when Indent =>
Indent_Action_0 (Parse_Data, Tree, Nonterm, (T1 => (False, (Simple, (Label => None))), T2 => (False, (Simple,
(Int, Ada_Indent_Broken))), T5 => (False, (Hanging_2, (Int, Ada_Indent_Broken), (Int, Ada_Indent_Broken))), T6
=> (False, (Hanging_1, (Anchored_1, T5, Ada_Indent_Broken), (Anchored_1, T5, 2 * Ada_Indent_Broken))), T8 =>
(False, (Simple, (Int, Ada_Indent_Broken)))));
end case;
end object_declaration_29;
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)
is
Parse_Data : Wisi.Parse_Data_Type renames Wisi.Parse_Data_Type (User_Data);
T1 : constant SAL.Peek_Type := 1;
T2 : constant SAL.Peek_Type := 2;
T5 : constant SAL.Peek_Type := 3;
T7 : constant SAL.Peek_Type := 4;
T8 : constant SAL.Peek_Type := 5;
begin
case Parse_Data.Post_Parse_Action is
when Navigate =>
Statement_Action (Parse_Data, Tree, Nonterm, ((T1, Statement_Start), (T8, Statement_End)));
when Face =>
null;
when Indent =>
Indent_Action_0 (Parse_Data, Tree, Nonterm, (T1 => (False, (Simple, (Label => None))), T2 => (False, (Simple,
(Int, Ada_Indent_Broken))), T5 => (False, (Hanging_2, (Int, Ada_Indent_Broken), (Int, Ada_Indent_Broken))), T7
=> (False, (Simple, (Int, Ada_Indent_Broken))), T8 => (False, (Simple, (Int, Ada_Indent_Broken)))));
end case;
end object_declaration_30;
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)
is
Parse_Data : Wisi.Parse_Data_Type renames Wisi.Parse_Data_Type (User_Data);
T1 : constant SAL.Peek_Type := 1;
T2 : constant SAL.Peek_Type := 2;
T5 : constant SAL.Peek_Type := 3;
T8 : constant SAL.Peek_Type := 4;
begin
case Parse_Data.Post_Parse_Action is
when Navigate =>
Statement_Action (Parse_Data, Tree, Nonterm, ((T1, Statement_Start), (T8, Statement_End)));
when Face =>
null;
when Indent =>
Indent_Action_0 (Parse_Data, Tree, Nonterm, (T1 => (False, (Simple, (Label => None))), T2 => (False, (Simple,
(Int, Ada_Indent_Broken))), T5 => (False, (Hanging_2, (Int, Ada_Indent_Broken), (Int, Ada_Indent_Broken))), T8
=> (False, (Simple, (Int, Ada_Indent_Broken)))));
end case;
end object_declaration_31;
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)
is
Parse_Data : Wisi.Parse_Data_Type renames Wisi.Parse_Data_Type (User_Data);
T1 : constant SAL.Peek_Type := 1;
T2 : constant SAL.Peek_Type := 2;
T3 : constant SAL.Peek_Type := 3;
T4 : constant SAL.Peek_Type := 4;
T5 : constant SAL.Peek_Type := 5;
T6 : constant SAL.Peek_Type := 6;
T7 : constant SAL.Peek_Type := 7;
T8 : constant SAL.Peek_Type := 8;
begin
case Parse_Data.Post_Parse_Action is
when Navigate =>
Statement_Action (Parse_Data, Tree, Nonterm, ((T1, Statement_Start), (T8, Statement_End)));
when Face =>
null;
when Indent =>
Indent_Action_0 (Parse_Data, Tree, Nonterm, (T1 => (False, (Simple, (Label => None))), T2 => (False, (Simple,
(Int, Ada_Indent_Broken))), T3 => (False, (Simple, (Int, Ada_Indent_Broken))), T4 => (False, (Simple, (Int,
Ada_Indent_Broken))), T5 => (False, (Hanging_2, (Int, Ada_Indent_Broken), (Int, Ada_Indent_Broken))), T6 =>
(False, (Hanging_1, (Anchored_1, T5, Ada_Indent_Broken), (Anchored_1, T5, 2 * Ada_Indent_Broken))), T7 =>
(False, (Simple, (Int, Ada_Indent_Broken))), T8 => (False, (Simple, (Int, Ada_Indent_Broken)))));
end case;
end object_declaration_32;
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)
is
Parse_Data : Wisi.Parse_Data_Type renames Wisi.Parse_Data_Type (User_Data);
T1 : constant SAL.Peek_Type := 1;
T2 : constant SAL.Peek_Type := 2;
T3 : constant SAL.Peek_Type := 3;
T4 : constant SAL.Peek_Type := 4;
T5 : constant SAL.Peek_Type := 5;
T6 : constant SAL.Peek_Type := 6;
T8 : constant SAL.Peek_Type := 7;
begin
case Parse_Data.Post_Parse_Action is
when Navigate =>
Statement_Action (Parse_Data, Tree, Nonterm, ((T1, Statement_Start), (T8, Statement_End)));
when Face =>
null;
when Indent =>
Indent_Action_0 (Parse_Data, Tree, Nonterm, (T1 => (False, (Simple, (Label => None))), T2 => (False, (Simple,
(Int, Ada_Indent_Broken))), T3 => (False, (Simple, (Int, Ada_Indent_Broken))), T4 => (False, (Simple, (Int,
Ada_Indent_Broken))), T5 => (False, (Hanging_2, (Int, Ada_Indent_Broken), (Int, Ada_Indent_Broken))), T6 =>
(False, (Hanging_1, (Anchored_1, T5, Ada_Indent_Broken), (Anchored_1, T5, 2 * Ada_Indent_Broken))), T8 =>
(False, (Simple, (Int, Ada_Indent_Broken)))));
end case;
end object_declaration_33;
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)
is
Parse_Data : Wisi.Parse_Data_Type renames Wisi.Parse_Data_Type (User_Data);
T1 : constant SAL.Peek_Type := 1;
T2 : constant SAL.Peek_Type := 2;
T3 : constant SAL.Peek_Type := 3;
T4 : constant SAL.Peek_Type := 4;
T5 : constant SAL.Peek_Type := 5;
T7 : constant SAL.Peek_Type := 6;
T8 : constant SAL.Peek_Type := 7;
begin
case Parse_Data.Post_Parse_Action is
when Navigate =>
Statement_Action (Parse_Data, Tree, Nonterm, ((T1, Statement_Start), (T8, Statement_End)));
when Face =>
null;
when Indent =>
Indent_Action_0 (Parse_Data, Tree, Nonterm, (T1 => (False, (Simple, (Label => None))), T2 => (False, (Simple,
(Int, Ada_Indent_Broken))), T3 => (False, (Simple, (Int, Ada_Indent_Broken))), T4 => (False, (Simple, (Int,
Ada_Indent_Broken))), T5 => (False, (Hanging_2, (Int, Ada_Indent_Broken), (Int, Ada_Indent_Broken))), T7 =>
(False, (Simple, (Int, Ada_Indent_Broken))), T8 => (False, (Simple, (Int, Ada_Indent_Broken)))));
end case;
end object_declaration_34;
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)
is
Parse_Data : Wisi.Parse_Data_Type renames Wisi.Parse_Data_Type (User_Data);
T1 : constant SAL.Peek_Type := 1;
T2 : constant SAL.Peek_Type := 2;
T3 : constant SAL.Peek_Type := 3;
T4 : constant SAL.Peek_Type := 4;
T5 : constant SAL.Peek_Type := 5;
T8 : constant SAL.Peek_Type := 6;
begin
case Parse_Data.Post_Parse_Action is
when Navigate =>
Statement_Action (Parse_Data, Tree, Nonterm, ((T1, Statement_Start), (T8, Statement_End)));
when Face =>
null;
when Indent =>
Indent_Action_0 (Parse_Data, Tree, Nonterm, (T1 => (False, (Simple, (Label => None))), T2 => (False, (Simple,
(Int, Ada_Indent_Broken))), T3 => (False, (Simple, (Int, Ada_Indent_Broken))), T4 => (False, (Simple, (Int,
Ada_Indent_Broken))), T5 => (False, (Hanging_2, (Int, Ada_Indent_Broken), (Int, Ada_Indent_Broken))), T8 =>
(False, (Simple, (Int, Ada_Indent_Broken)))));
end case;
end object_declaration_35;
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)
is
Parse_Data : Wisi.Parse_Data_Type renames Wisi.Parse_Data_Type (User_Data);
T1 : constant SAL.Peek_Type := 1;
T2 : constant SAL.Peek_Type := 2;
T3 : constant SAL.Peek_Type := 3;
T5 : constant SAL.Peek_Type := 4;
T6 : constant SAL.Peek_Type := 5;
T7 : constant SAL.Peek_Type := 6;
T8 : constant SAL.Peek_Type := 7;
begin
case Parse_Data.Post_Parse_Action is
when Navigate =>
Statement_Action (Parse_Data, Tree, Nonterm, ((T1, Statement_Start), (T8, Statement_End)));
when Face =>
null;
when Indent =>
Indent_Action_0 (Parse_Data, Tree, Nonterm, (T1 => (False, (Simple, (Label => None))), T2 => (False, (Simple,
(Int, Ada_Indent_Broken))), T3 => (False, (Simple, (Int, Ada_Indent_Broken))), T5 => (False, (Hanging_2, (Int,
Ada_Indent_Broken), (Int, Ada_Indent_Broken))), T6 => (False, (Hanging_1, (Anchored_1, T5, Ada_Indent_Broken),
(Anchored_1, T5, 2 * Ada_Indent_Broken))), T7 => (False, (Simple, (Int, Ada_Indent_Broken))), T8 => (False,
(Simple, (Int, Ada_Indent_Broken)))));
end case;
end object_declaration_36;
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)
is
Parse_Data : Wisi.Parse_Data_Type renames Wisi.Parse_Data_Type (User_Data);
T1 : constant SAL.Peek_Type := 1;
T2 : constant SAL.Peek_Type := 2;
T3 : constant SAL.Peek_Type := 3;
T5 : constant SAL.Peek_Type := 4;
T6 : constant SAL.Peek_Type := 5;
T8 : constant SAL.Peek_Type := 6;
begin
case Parse_Data.Post_Parse_Action is
when Navigate =>
Statement_Action (Parse_Data, Tree, Nonterm, ((T1, Statement_Start), (T8, Statement_End)));
when Face =>
null;
when Indent =>
Indent_Action_0 (Parse_Data, Tree, Nonterm, (T1 => (False, (Simple, (Label => None))), T2 => (False, (Simple,
(Int, Ada_Indent_Broken))), T3 => (False, (Simple, (Int, Ada_Indent_Broken))), T5 => (False, (Hanging_2, (Int,
Ada_Indent_Broken), (Int, Ada_Indent_Broken))), T6 => (False, (Hanging_1, (Anchored_1, T5, Ada_Indent_Broken),
(Anchored_1, T5, 2 * Ada_Indent_Broken))), T8 => (False, (Simple, (Int, Ada_Indent_Broken)))));
end case;
end object_declaration_37;
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)
is
Parse_Data : Wisi.Parse_Data_Type renames Wisi.Parse_Data_Type (User_Data);
T1 : constant SAL.Peek_Type := 1;
T2 : constant SAL.Peek_Type := 2;
T3 : constant SAL.Peek_Type := 3;
T5 : constant SAL.Peek_Type := 4;
T7 : constant SAL.Peek_Type := 5;
T8 : constant SAL.Peek_Type := 6;
begin
case Parse_Data.Post_Parse_Action is
when Navigate =>
Statement_Action (Parse_Data, Tree, Nonterm, ((T1, Statement_Start), (T8, Statement_End)));
when Face =>
null;
when Indent =>
Indent_Action_0 (Parse_Data, Tree, Nonterm, (T1 => (False, (Simple, (Label => None))), T2 => (False, (Simple,
(Int, Ada_Indent_Broken))), T3 => (False, (Simple, (Int, Ada_Indent_Broken))), T5 => (False, (Hanging_2, (Int,
Ada_Indent_Broken), (Int, Ada_Indent_Broken))), T7 => (False, (Simple, (Int, Ada_Indent_Broken))), T8 =>
(False, (Simple, (Int, Ada_Indent_Broken)))));
end case;
end object_declaration_38;
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)
is
Parse_Data : Wisi.Parse_Data_Type renames Wisi.Parse_Data_Type (User_Data);
T1 : constant SAL.Peek_Type := 1;
T2 : constant SAL.Peek_Type := 2;
T3 : constant SAL.Peek_Type := 3;
T5 : constant SAL.Peek_Type := 4;
T8 : constant SAL.Peek_Type := 5;
begin
case Parse_Data.Post_Parse_Action is
when Navigate =>
Statement_Action (Parse_Data, Tree, Nonterm, ((T1, Statement_Start), (T8, Statement_End)));
when Face =>
null;
when Indent =>
Indent_Action_0 (Parse_Data, Tree, Nonterm, (T1 => (False, (Simple, (Label => None))), T2 => (False, (Simple,
(Int, Ada_Indent_Broken))), T3 => (False, (Simple, (Int, Ada_Indent_Broken))), T5 => (False, (Hanging_2, (Int,
Ada_Indent_Broken), (Int, Ada_Indent_Broken))), T8 => (False, (Simple, (Int, Ada_Indent_Broken)))));
end case;
end object_declaration_39;
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)
is
Parse_Data : Wisi.Parse_Data_Type renames Wisi.Parse_Data_Type (User_Data);
T1 : constant SAL.Peek_Type := 1;
T2 : constant SAL.Peek_Type := 2;
T4 : constant SAL.Peek_Type := 3;
T5 : constant SAL.Peek_Type := 4;
T6 : constant SAL.Peek_Type := 5;
T7 : constant SAL.Peek_Type := 6;
T8 : constant SAL.Peek_Type := 7;
begin
case Parse_Data.Post_Parse_Action is
when Navigate =>
Statement_Action (Parse_Data, Tree, Nonterm, ((T1, Statement_Start), (T8, Statement_End)));
when Face =>
null;
when Indent =>
Indent_Action_0 (Parse_Data, Tree, Nonterm, (T1 => (False, (Simple, (Label => None))), T2 => (False, (Simple,
(Int, Ada_Indent_Broken))), T4 => (False, (Simple, (Int, Ada_Indent_Broken))), T5 => (False, (Hanging_2, (Int,
Ada_Indent_Broken), (Int, Ada_Indent_Broken))), T6 => (False, (Hanging_1, (Anchored_1, T5, Ada_Indent_Broken),
(Anchored_1, T5, 2 * Ada_Indent_Broken))), T7 => (False, (Simple, (Int, Ada_Indent_Broken))), T8 => (False,
(Simple, (Int, Ada_Indent_Broken)))));
end case;
end object_declaration_40;
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)
is
Parse_Data : Wisi.Parse_Data_Type renames Wisi.Parse_Data_Type (User_Data);
T1 : constant SAL.Peek_Type := 1;
T2 : constant SAL.Peek_Type := 2;
T4 : constant SAL.Peek_Type := 3;
T5 : constant SAL.Peek_Type := 4;
T6 : constant SAL.Peek_Type := 5;
T8 : constant SAL.Peek_Type := 6;
begin
case Parse_Data.Post_Parse_Action is
when Navigate =>
Statement_Action (Parse_Data, Tree, Nonterm, ((T1, Statement_Start), (T8, Statement_End)));
when Face =>
null;
when Indent =>
Indent_Action_0 (Parse_Data, Tree, Nonterm, (T1 => (False, (Simple, (Label => None))), T2 => (False, (Simple,
(Int, Ada_Indent_Broken))), T4 => (False, (Simple, (Int, Ada_Indent_Broken))), T5 => (False, (Hanging_2, (Int,
Ada_Indent_Broken), (Int, Ada_Indent_Broken))), T6 => (False, (Hanging_1, (Anchored_1, T5, Ada_Indent_Broken),
(Anchored_1, T5, 2 * Ada_Indent_Broken))), T8 => (False, (Simple, (Int, Ada_Indent_Broken)))));
end case;
end object_declaration_41;
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)
is
Parse_Data : Wisi.Parse_Data_Type renames Wisi.Parse_Data_Type (User_Data);
T1 : constant SAL.Peek_Type := 1;
T2 : constant SAL.Peek_Type := 2;
T4 : constant SAL.Peek_Type := 3;
T5 : constant SAL.Peek_Type := 4;
T7 : constant SAL.Peek_Type := 5;
T8 : constant SAL.Peek_Type := 6;
begin
case Parse_Data.Post_Parse_Action is
when Navigate =>
Statement_Action (Parse_Data, Tree, Nonterm, ((T1, Statement_Start), (T8, Statement_End)));
when Face =>
null;
when Indent =>
Indent_Action_0 (Parse_Data, Tree, Nonterm, (T1 => (False, (Simple, (Label => None))), T2 => (False, (Simple,
(Int, Ada_Indent_Broken))), T4 => (False, (Simple, (Int, Ada_Indent_Broken))), T5 => (False, (Hanging_2, (Int,
Ada_Indent_Broken), (Int, Ada_Indent_Broken))), T7 => (False, (Simple, (Int, Ada_Indent_Broken))), T8 =>
(False, (Simple, (Int, Ada_Indent_Broken)))));
end case;
end object_declaration_42;
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)
is
Parse_Data : Wisi.Parse_Data_Type renames Wisi.Parse_Data_Type (User_Data);
T1 : constant SAL.Peek_Type := 1;
T2 : constant SAL.Peek_Type := 2;
T4 : constant SAL.Peek_Type := 3;
T5 : constant SAL.Peek_Type := 4;
T8 : constant SAL.Peek_Type := 5;
begin
case Parse_Data.Post_Parse_Action is
when Navigate =>
Statement_Action (Parse_Data, Tree, Nonterm, ((T1, Statement_Start), (T8, Statement_End)));
when Face =>
null;
when Indent =>
Indent_Action_0 (Parse_Data, Tree, Nonterm, (T1 => (False, (Simple, (Label => None))), T2 => (False, (Simple,
(Int, Ada_Indent_Broken))), T4 => (False, (Simple, (Int, Ada_Indent_Broken))), T5 => (False, (Hanging_2, (Int,
Ada_Indent_Broken), (Int, Ada_Indent_Broken))), T8 => (False, (Simple, (Int, Ada_Indent_Broken)))));
end case;
end object_declaration_43;
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)
is
Parse_Data : Wisi.Parse_Data_Type renames Wisi.Parse_Data_Type (User_Data);
T1 : constant SAL.Peek_Type := 1;
T2 : constant SAL.Peek_Type := 2;
T5 : constant SAL.Peek_Type := 3;
T6 : constant SAL.Peek_Type := 4;
T7 : constant SAL.Peek_Type := 5;
T8 : constant SAL.Peek_Type := 6;
begin
case Parse_Data.Post_Parse_Action is
when Navigate =>
Statement_Action (Parse_Data, Tree, Nonterm, ((T1, Statement_Start), (T8, Statement_End)));
when Face =>
null;
when Indent =>
Indent_Action_0 (Parse_Data, Tree, Nonterm, (T1 => (False, (Simple, (Label => None))), T2 => (False, (Simple,
(Int, Ada_Indent_Broken))), T5 => (False, (Hanging_2, (Int, Ada_Indent_Broken), (Int, Ada_Indent_Broken))), T6
=> (False, (Hanging_1, (Anchored_1, T5, Ada_Indent_Broken), (Anchored_1, T5, 2 * Ada_Indent_Broken))), T7 =>
(False, (Simple, (Int, Ada_Indent_Broken))), T8 => (False, (Simple, (Int, Ada_Indent_Broken)))));
end case;
end object_declaration_44;
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)
is
Parse_Data : Wisi.Parse_Data_Type renames Wisi.Parse_Data_Type (User_Data);
T1 : constant SAL.Peek_Type := 1;
T2 : constant SAL.Peek_Type := 2;
T5 : constant SAL.Peek_Type := 3;
T6 : constant SAL.Peek_Type := 4;
T8 : constant SAL.Peek_Type := 5;
begin
case Parse_Data.Post_Parse_Action is
when Navigate =>
Statement_Action (Parse_Data, Tree, Nonterm, ((T1, Statement_Start), (T8, Statement_End)));
when Face =>
null;
when Indent =>
Indent_Action_0 (Parse_Data, Tree, Nonterm, (T1 => (False, (Simple, (Label => None))), T2 => (False, (Simple,
(Int, Ada_Indent_Broken))), T5 => (False, (Hanging_2, (Int, Ada_Indent_Broken), (Int, Ada_Indent_Broken))), T6
=> (False, (Hanging_1, (Anchored_1, T5, Ada_Indent_Broken), (Anchored_1, T5, 2 * Ada_Indent_Broken))), T8 =>
(False, (Simple, (Int, Ada_Indent_Broken)))));
end case;
end object_declaration_45;
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)
is
Parse_Data : Wisi.Parse_Data_Type renames Wisi.Parse_Data_Type (User_Data);
T1 : constant SAL.Peek_Type := 1;
T2 : constant SAL.Peek_Type := 2;
T5 : constant SAL.Peek_Type := 3;
T7 : constant SAL.Peek_Type := 4;
T8 : constant SAL.Peek_Type := 5;
begin
case Parse_Data.Post_Parse_Action is
when Navigate =>
Statement_Action (Parse_Data, Tree, Nonterm, ((T1, Statement_Start), (T8, Statement_End)));
when Face =>
null;
when Indent =>
Indent_Action_0 (Parse_Data, Tree, Nonterm, (T1 => (False, (Simple, (Label => None))), T2 => (False, (Simple,
(Int, Ada_Indent_Broken))), T5 => (False, (Hanging_2, (Int, Ada_Indent_Broken), (Int, Ada_Indent_Broken))), T7
=> (False, (Simple, (Int, Ada_Indent_Broken))), T8 => (False, (Simple, (Int, Ada_Indent_Broken)))));
end case;
end object_declaration_46;
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)
is
Parse_Data : Wisi.Parse_Data_Type renames Wisi.Parse_Data_Type (User_Data);
T1 : constant SAL.Peek_Type := 1;
T2 : constant SAL.Peek_Type := 2;
T5 : constant SAL.Peek_Type := 3;
T8 : constant SAL.Peek_Type := 4;
begin
case Parse_Data.Post_Parse_Action is
when Navigate =>
Statement_Action (Parse_Data, Tree, Nonterm, ((T1, Statement_Start), (T8, Statement_End)));
when Face =>
null;
when Indent =>
Indent_Action_0 (Parse_Data, Tree, Nonterm, (T1 => (False, (Simple, (Label => None))), T2 => (False, (Simple,
(Int, Ada_Indent_Broken))), T5 => (False, (Hanging_2, (Int, Ada_Indent_Broken), (Int, Ada_Indent_Broken))), T8
=> (False, (Simple, (Int, Ada_Indent_Broken)))));
end case;
end object_declaration_47;
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)
is
Parse_Data : Wisi.Parse_Data_Type renames Wisi.Parse_Data_Type (User_Data);
begin
case Parse_Data.Post_Parse_Action is
when Navigate =>
Name_Action (Parse_Data, Tree, Nonterm, 1);
when Face =>
null;
when Indent =>
null;
end case;
end defining_identifier_list_0;
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)
is
Parse_Data : Wisi.Parse_Data_Type renames Wisi.Parse_Data_Type (User_Data);
T1 : constant SAL.Peek_Type := 1;
T2 : constant SAL.Peek_Type := 2;
T3 : constant SAL.Peek_Type := 3;
begin
case Parse_Data.Post_Parse_Action is
when Navigate =>
Name_Action (Parse_Data, Tree, Nonterm, T3);
when Face =>
null;
when Indent =>
Indent_Action_0 (Parse_Data, Tree, Nonterm, (T1 => (False, (Simple, (Label => None))), T2 => (False, (Simple,
(Label => None))), T3 => (False, (Simple, (Int, Ada_Indent_Broken)))));
end case;
end defining_identifier_list_1;
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)
is
Parse_Data : Wisi.Parse_Data_Type renames Wisi.Parse_Data_Type (User_Data);
T1 : constant SAL.Peek_Type := 1;
T2 : constant SAL.Peek_Type := 2;
T3 : constant SAL.Peek_Type := 3;
T4 : constant SAL.Peek_Type := 4;
T5 : constant SAL.Peek_Type := 5;
begin
case Parse_Data.Post_Parse_Action is
when Navigate =>
Statement_Action (Parse_Data, Tree, Nonterm, ((T1, Statement_Start), (T5, Statement_End)));
when Face =>
null;
when Indent =>
Indent_Action_0 (Parse_Data, Tree, Nonterm, (T1 => (False, (Simple, (Label => None))), T2 => (False, (Simple,
(Int, Ada_Indent_Broken))), T3 => (False, (Simple, (Int, Ada_Indent_Broken))), T4 => (False, (Hanging_1,
(Anchored_1, T4, Ada_Indent_Broken), (Anchored_1, T4, 2 * Ada_Indent_Broken))), T5 => (False, (Simple, (Int,
Ada_Indent_Broken)))));
end case;
end number_declaration_0;
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)
is
Parse_Data : Wisi.Parse_Data_Type renames Wisi.Parse_Data_Type (User_Data);
T1 : constant SAL.Peek_Type := 1;
T2 : constant SAL.Peek_Type := 2;
T3 : constant SAL.Peek_Type := 3;
begin
case Parse_Data.Post_Parse_Action is
when Navigate =>
null;
when Face =>
null;
when Indent =>
Indent_Action_0 (Parse_Data, Tree, Nonterm, (T1 => (False, (Simple, (Label => None))), T2 => (False, (Simple,
(Anchored_0, T1, 1))), T3 => (False, (Simple, (Anchored_0, T1, 0)))));
end case;
end enumeration_type_definition_0;
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)
is
Parse_Data : Wisi.Parse_Data_Type renames Wisi.Parse_Data_Type (User_Data);
begin
case Parse_Data.Post_Parse_Action is
when Navigate =>
null;
when Face =>
null;
when Indent =>
Indent_Action_0 (Parse_Data, Tree, Nonterm, (1 => (False, (Hanging_0, (Label => None), (Int,
Ada_Indent_Broken)))));
end case;
end integer_type_definition_0;
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)
is
Parse_Data : Wisi.Parse_Data_Type renames Wisi.Parse_Data_Type (User_Data);
begin
case Parse_Data.Post_Parse_Action is
when Navigate =>
null;
when Face =>
null;
when Indent =>
Indent_Action_0 (Parse_Data, Tree, Nonterm, (1 => (False, (Hanging_0, (Label => None), (Int,
Ada_Indent_Broken)))));
end case;
end integer_type_definition_1;
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)
is
Parse_Data : Wisi.Parse_Data_Type renames Wisi.Parse_Data_Type (User_Data);
T1 : constant SAL.Peek_Type := 1;
T2 : constant SAL.Peek_Type := 2;
T3 : constant SAL.Peek_Type := 3;
T4 : constant SAL.Peek_Type := 4;
T5 : constant SAL.Peek_Type := 5;
T6 : constant SAL.Peek_Type := 6;
begin
case Parse_Data.Post_Parse_Action is
when Navigate =>
null;
when Face =>
null;
when Indent =>
Indent_Action_0 (Parse_Data, Tree, Nonterm, (T1 => (False, (Simple, (Label => None))), T2 => (False, (Simple,
(Label => None))), T3 => (False, (Simple, (Anchored_0, T2, 1))), T4 => (False, (Simple, (Anchored_0, T2, 0))),
T5 => (False, (Simple, (Label => None))), T6 => (False, (Simple, (Label => None)))));
end case;
end unconstrained_array_definition_0;
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)
is
Parse_Data : Wisi.Parse_Data_Type renames Wisi.Parse_Data_Type (User_Data);
T1 : constant SAL.Peek_Type := 1;
T2 : constant SAL.Peek_Type := 2;
T3 : constant SAL.Peek_Type := 3;
T4 : constant SAL.Peek_Type := 4;
T5 : constant SAL.Peek_Type := 5;
T6 : constant SAL.Peek_Type := 6;
begin
case Parse_Data.Post_Parse_Action is
when Navigate =>
null;
when Face =>
null;
when Indent =>
Indent_Action_0 (Parse_Data, Tree, Nonterm, (T1 => (False, (Simple, (Label => None))), T2 => (False, (Simple,
(Label => None))), T3 => (False, (Simple, (Anchored_0, T2, 1))), T4 => (False, (Simple, (Anchored_0, T2, 0))),
T5 => (False, (Simple, (Label => None))), T6 => (False, (Simple, (Label => None)))));
end case;
end constrained_array_definition_0;
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)
is
Parse_Data : Wisi.Parse_Data_Type renames Wisi.Parse_Data_Type (User_Data);
begin
case Parse_Data.Post_Parse_Action is
when Navigate =>
null;
when Face =>
null;
when Indent =>
Indent_Action_0 (Parse_Data, Tree, Nonterm, (1 => (False, (Hanging_0, (Label => None), (Int,
Ada_Indent_Broken)))));
end case;
end discrete_range_0;
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)
is
Parse_Data : Wisi.Parse_Data_Type renames Wisi.Parse_Data_Type (User_Data);
begin
case Parse_Data.Post_Parse_Action is
when Navigate =>
null;
when Face =>
null;
when Indent =>
Indent_Action_0 (Parse_Data, Tree, Nonterm, (1 => (False, (Hanging_0, (Label => None), (Int,
Ada_Indent_Broken)))));
end case;
end discrete_range_1;
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)
is
Parse_Data : Wisi.Parse_Data_Type renames Wisi.Parse_Data_Type (User_Data);
T1 : constant SAL.Peek_Type := 1;
T2 : constant SAL.Peek_Type := 2;
T3 : constant SAL.Peek_Type := 3;
begin
case Parse_Data.Post_Parse_Action is
when Navigate =>
null;
when Face =>
null;
when Indent =>
Indent_Action_0 (Parse_Data, Tree, Nonterm, (T1 => (False, (Simple, (Label => None))), T2 => (False, (Simple,
(Anchored_0, T1, 1))), T3 => (False, (Simple, (Anchored_0, T1, 0)))));
end case;
end known_discriminant_part_0;
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)
is
Parse_Data : Wisi.Parse_Data_Type renames Wisi.Parse_Data_Type (User_Data);
T1 : constant SAL.Peek_Type := 1;
T2 : constant SAL.Peek_Type := 2;
T3 : constant SAL.Peek_Type := 3;
T4 : constant SAL.Peek_Type := 4;
T5 : constant SAL.Peek_Type := 5;
begin
case Parse_Data.Post_Parse_Action is
when Navigate =>
null;
when Face =>
Face_Apply_Action (Parse_Data, Tree, Nonterm, (1 => (T4, 1, 2)));
when Indent =>
Indent_Action_0 (Parse_Data, Tree, Nonterm, (T1 => (False, (Simple, (Label => None))), T2 => (False, (Simple,
(Int, Ada_Indent_Broken))), T3 => (False, (Simple, (Int, Ada_Indent_Broken))), T4 => (False, (Simple, (Int,
Ada_Indent_Broken))), T5 => (False, (Hanging_1, (Anchored_1, T4, Ada_Indent_Broken), (Anchored_1, T4, 2 *
Ada_Indent_Broken)))));
end case;
end discriminant_specification_0;
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)
is
Parse_Data : Wisi.Parse_Data_Type renames Wisi.Parse_Data_Type (User_Data);
T1 : constant SAL.Peek_Type := 1;
T2 : constant SAL.Peek_Type := 2;
T3 : constant SAL.Peek_Type := 3;
T4 : constant SAL.Peek_Type := 4;
begin
case Parse_Data.Post_Parse_Action is
when Navigate =>
null;
when Face =>
Face_Apply_Action (Parse_Data, Tree, Nonterm, (1 => (T4, 1, 2)));
when Indent =>
Indent_Action_0 (Parse_Data, Tree, Nonterm, (T1 => (False, (Simple, (Label => None))), T2 => (False, (Simple,
(Int, Ada_Indent_Broken))), T3 => (False, (Simple, (Int, Ada_Indent_Broken))), T4 => (False, (Simple, (Int,
Ada_Indent_Broken)))));
end case;
end discriminant_specification_1;
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)
is
Parse_Data : Wisi.Parse_Data_Type renames Wisi.Parse_Data_Type (User_Data);
T1 : constant SAL.Peek_Type := 1;
T2 : constant SAL.Peek_Type := 2;
T4 : constant SAL.Peek_Type := 3;
T5 : constant SAL.Peek_Type := 4;
begin
case Parse_Data.Post_Parse_Action is
when Navigate =>
null;
when Face =>
Face_Apply_Action (Parse_Data, Tree, Nonterm, (1 => (T4, 1, 2)));
when Indent =>
Indent_Action_0 (Parse_Data, Tree, Nonterm, (T1 => (False, (Simple, (Label => None))), T2 => (False, (Simple,
(Int, Ada_Indent_Broken))), T4 => (False, (Simple, (Int, Ada_Indent_Broken))), T5 => (False, (Hanging_1,
(Anchored_1, T4, Ada_Indent_Broken), (Anchored_1, T4, 2 * Ada_Indent_Broken)))));
end case;
end discriminant_specification_2;
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)
is
Parse_Data : Wisi.Parse_Data_Type renames Wisi.Parse_Data_Type (User_Data);
T1 : constant SAL.Peek_Type := 1;
T2 : constant SAL.Peek_Type := 2;
T4 : constant SAL.Peek_Type := 3;
begin
case Parse_Data.Post_Parse_Action is
when Navigate =>
null;
when Face =>
Face_Apply_Action (Parse_Data, Tree, Nonterm, (1 => (T4, 1, 2)));
when Indent =>
Indent_Action_0 (Parse_Data, Tree, Nonterm, (T1 => (False, (Simple, (Label => None))), T2 => (False, (Simple,
(Int, Ada_Indent_Broken))), T4 => (False, (Simple, (Int, Ada_Indent_Broken)))));
end case;
end discriminant_specification_3;
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)
is
Parse_Data : Wisi.Parse_Data_Type renames Wisi.Parse_Data_Type (User_Data);
T1 : constant SAL.Peek_Type := 1;
T2 : constant SAL.Peek_Type := 2;
T3 : constant SAL.Peek_Type := 3;
T4 : constant SAL.Peek_Type := 4;
begin
case Parse_Data.Post_Parse_Action is
when Navigate =>
null;
when Face =>
null;
when Indent =>
Indent_Action_0 (Parse_Data, Tree, Nonterm, (T1 => (False, (Simple, (Label => None))), T2 => (False, (Simple,
(Int, Ada_Indent_Broken))), T3 => (False, (Simple, (Int, Ada_Indent_Broken))), T4 => (False, (Hanging_1,
(Anchored_1, T3, Ada_Indent_Broken), (Anchored_1, T3, 2 * Ada_Indent_Broken)))));
end case;
end discriminant_specification_4;
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)
is
Parse_Data : Wisi.Parse_Data_Type renames Wisi.Parse_Data_Type (User_Data);
T1 : constant SAL.Peek_Type := 1;
T2 : constant SAL.Peek_Type := 2;
T3 : constant SAL.Peek_Type := 3;
begin
case Parse_Data.Post_Parse_Action is
when Navigate =>
null;
when Face =>
null;
when Indent =>
Indent_Action_0 (Parse_Data, Tree, Nonterm, (T1 => (False, (Simple, (Label => None))), T2 => (False, (Simple,
(Int, Ada_Indent_Broken))), T3 => (False, (Simple, (Int, Ada_Indent_Broken)))));
end case;
end discriminant_specification_5;
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)
is
Parse_Data : Wisi.Parse_Data_Type renames Wisi.Parse_Data_Type (User_Data);
T1 : constant SAL.Peek_Type := 1;
T2 : constant SAL.Peek_Type := 2;
T3 : constant SAL.Peek_Type := 3;
T4 : constant SAL.Peek_Type := 4;
T5 : constant SAL.Peek_Type := 5;
begin
case Parse_Data.Post_Parse_Action is
when Navigate =>
null;
when Face =>
null;
when Indent =>
Indent_Action_0 (Parse_Data, Tree, Nonterm, (T1 => (False, (Simple, (Language, Ada_Indent_Record_1'Access, 83
& Integer (T1) & 0))), T2 => (True, (Simple, (Language, Ada_Indent_Record_1'Access, 83 & Integer (T1) &
Ada_Indent)), (Simple, (Language, Ada_Indent_Record_1'Access, 83 & Integer (T1) & Ada_Indent))), T3 => (False,
(Simple, (Language, Ada_Indent_Record_1'Access, 83 & Integer (T1) & 0))), T4 => (False, (Simple, (Label =>
None))), T5 => (False, (Simple, (Int, Ada_Indent_Broken)))));
end case;
end record_definition_0;
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)
is
Parse_Data : Wisi.Parse_Data_Type renames Wisi.Parse_Data_Type (User_Data);
T1 : constant SAL.Peek_Type := 1;
T2 : constant SAL.Peek_Type := 2;
T3 : constant SAL.Peek_Type := 3;
T4 : constant SAL.Peek_Type := 4;
begin
case Parse_Data.Post_Parse_Action is
when Navigate =>
null;
when Face =>
null;
when Indent =>
Indent_Action_0 (Parse_Data, Tree, Nonterm, (T1 => (False, (Simple, (Language, Ada_Indent_Record_1'Access, 83
& Integer (T1) & 0))), T2 => (True, (Simple, (Language, Ada_Indent_Record_1'Access, 83 & Integer (T1) &
Ada_Indent)), (Simple, (Language, Ada_Indent_Record_1'Access, 83 & Integer (T1) & Ada_Indent))), T3 => (False,
(Simple, (Language, Ada_Indent_Record_1'Access, 83 & Integer (T1) & 0))), T4 => (False, (Simple, (Label =>
None)))));
end case;
end record_definition_1;
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)
is
Parse_Data : Wisi.Parse_Data_Type renames Wisi.Parse_Data_Type (User_Data);
T1 : constant SAL.Peek_Type := 1;
T2 : constant SAL.Peek_Type := 2;
begin
case Parse_Data.Post_Parse_Action is
when Navigate =>
Statement_Action (Parse_Data, Tree, Nonterm, ((T1, Statement_Start), (T2, Statement_End)));
when Face =>
null;
when Indent =>
null;
end case;
end component_list_3;
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)
is
Parse_Data : Wisi.Parse_Data_Type renames Wisi.Parse_Data_Type (User_Data);
T1 : constant SAL.Peek_Type := 1;
T2 : constant SAL.Peek_Type := 2;
T3 : constant SAL.Peek_Type := 3;
T4 : constant SAL.Peek_Type := 4;
T5 : constant SAL.Peek_Type := 5;
T6 : constant SAL.Peek_Type := 6;
begin
case Parse_Data.Post_Parse_Action is
when Navigate =>
Statement_Action (Parse_Data, Tree, Nonterm, ((T1, Statement_Start), (T6, Statement_End)));
when Face =>
null;
when Indent =>
Indent_Action_0 (Parse_Data, Tree, Nonterm, (T1 => (False, (Simple, (Label => None))), T2 => (False, (Simple,
(Int, Ada_Indent_Broken))), T3 => (False, (Simple, (Int, Ada_Indent_Broken))), T4 => (False, (Hanging_1,
(Anchored_1, T3, Ada_Indent_Broken), (Anchored_1, T3, 2 * Ada_Indent_Broken))), T5 => (False, (Simple, (Int,
Ada_Indent_Broken))), T6 => (False, (Simple, (Int, Ada_Indent_Broken)))));
end case;
end component_declaration_0;
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)
is
Parse_Data : Wisi.Parse_Data_Type renames Wisi.Parse_Data_Type (User_Data);
T1 : constant SAL.Peek_Type := 1;
T2 : constant SAL.Peek_Type := 2;
T3 : constant SAL.Peek_Type := 3;
T4 : constant SAL.Peek_Type := 4;
T6 : constant SAL.Peek_Type := 5;
begin
case Parse_Data.Post_Parse_Action is
when Navigate =>
Statement_Action (Parse_Data, Tree, Nonterm, ((T1, Statement_Start), (T6, Statement_End)));
when Face =>
null;
when Indent =>
Indent_Action_0 (Parse_Data, Tree, Nonterm, (T1 => (False, (Simple, (Label => None))), T2 => (False, (Simple,
(Int, Ada_Indent_Broken))), T3 => (False, (Simple, (Int, Ada_Indent_Broken))), T4 => (False, (Hanging_1,
(Anchored_1, T3, Ada_Indent_Broken), (Anchored_1, T3, 2 * Ada_Indent_Broken))), T6 => (False, (Simple, (Int,
Ada_Indent_Broken)))));
end case;
end component_declaration_1;
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)
is
Parse_Data : Wisi.Parse_Data_Type renames Wisi.Parse_Data_Type (User_Data);
T1 : constant SAL.Peek_Type := 1;
T2 : constant SAL.Peek_Type := 2;
T3 : constant SAL.Peek_Type := 3;
T5 : constant SAL.Peek_Type := 4;
T6 : constant SAL.Peek_Type := 5;
begin
case Parse_Data.Post_Parse_Action is
when Navigate =>
Statement_Action (Parse_Data, Tree, Nonterm, ((T1, Statement_Start), (T6, Statement_End)));
when Face =>
null;
when Indent =>
Indent_Action_0 (Parse_Data, Tree, Nonterm, (T1 => (False, (Simple, (Label => None))), T2 => (False, (Simple,
(Int, Ada_Indent_Broken))), T3 => (False, (Simple, (Int, Ada_Indent_Broken))), T5 => (False, (Simple, (Int,
Ada_Indent_Broken))), T6 => (False, (Simple, (Int, Ada_Indent_Broken)))));
end case;
end component_declaration_2;
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)
is
Parse_Data : Wisi.Parse_Data_Type renames Wisi.Parse_Data_Type (User_Data);
T1 : constant SAL.Peek_Type := 1;
T2 : constant SAL.Peek_Type := 2;
T3 : constant SAL.Peek_Type := 3;
T6 : constant SAL.Peek_Type := 4;
begin
case Parse_Data.Post_Parse_Action is
when Navigate =>
Statement_Action (Parse_Data, Tree, Nonterm, ((T1, Statement_Start), (T6, Statement_End)));
when Face =>
null;
when Indent =>
Indent_Action_0 (Parse_Data, Tree, Nonterm, (T1 => (False, (Simple, (Label => None))), T2 => (False, (Simple,
(Int, Ada_Indent_Broken))), T3 => (False, (Simple, (Int, Ada_Indent_Broken))), T6 => (False, (Simple, (Int,
Ada_Indent_Broken)))));
end case;
end component_declaration_3;
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)
is
Parse_Data : Wisi.Parse_Data_Type renames Wisi.Parse_Data_Type (User_Data);
begin
case Parse_Data.Post_Parse_Action is
when Navigate =>
Motion_Action (Parse_Data, Tree, Nonterm, (Index_ID'(1, Invalid_Token_ID) & Index_ID'(2, Invalid_Token_ID)));
when Face =>
null;
when Indent =>
null;
end case;
end variant_list_1;
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)
is
Parse_Data : Wisi.Parse_Data_Type renames Wisi.Parse_Data_Type (User_Data);
T1 : constant SAL.Peek_Type := 1;
T2 : constant SAL.Peek_Type := 2;
T3 : constant SAL.Peek_Type := 3;
T4 : constant SAL.Peek_Type := 4;
T5 : constant SAL.Peek_Type := 5;
T6 : constant SAL.Peek_Type := 6;
T7 : constant SAL.Peek_Type := 7;
begin
case Parse_Data.Post_Parse_Action is
when Navigate =>
Statement_Action (Parse_Data, Tree, Nonterm, ((T1, Statement_Start), (T7, Statement_End)));
Motion_Action (Parse_Data, Tree, Nonterm, (Index_ID'(T1, Invalid_Token_ID) & Index_ID'(T4, Invalid_Token_ID) &
Index_ID'(T7, Invalid_Token_ID)));
when Face =>
null;
when Indent =>
Indent_Action_0 (Parse_Data, Tree, Nonterm, (T1 => (False, (Simple, (Label => None))), T2 => (False, (Simple,
(Int, Ada_Indent_Broken))), T3 => (False, (Simple, (Label => None))), T4 => (False, (Simple, (Int,
Ada_Indent_When))), T5 => (False, (Simple, (Label => None))), T6 => (False, (Simple, (Int,
Ada_Indent_Broken))), T7 => (False, (Simple, (Int, Ada_Indent_Broken)))));
end case;
end variant_part_0;
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)
is
Parse_Data : Wisi.Parse_Data_Type renames Wisi.Parse_Data_Type (User_Data);
T1 : constant SAL.Peek_Type := 1;
T2 : constant SAL.Peek_Type := 2;
T3 : constant SAL.Peek_Type := 3;
T4 : constant SAL.Peek_Type := 4;
begin
case Parse_Data.Post_Parse_Action is
when Navigate =>
Statement_Action (Parse_Data, Tree, Nonterm, (1 => (T1, Motion)));
when Face =>
null;
when Indent =>
Indent_Action_0 (Parse_Data, Tree, Nonterm, (T1 => (False, (Simple, (Label => None))), T2 => (False, (Simple,
(Label => None))), T3 => (False, (Simple, (Int, Ada_Indent))), T4 => (True, (Simple, (Int, Ada_Indent)),
(Simple, (Int, Ada_Indent)))));
end case;
end variant_0;
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)
is
Parse_Data : Wisi.Parse_Data_Type renames Wisi.Parse_Data_Type (User_Data);
begin
case Parse_Data.Post_Parse_Action is
when Navigate =>
null;
when Face =>
null;
when Indent =>
Indent_Action_0 (Parse_Data, Tree, Nonterm, (1 => (False, (Hanging_0, (Label => None), (Int,
Ada_Indent_Broken)))));
end case;
end discrete_choice_0;
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)
is
Parse_Data : Wisi.Parse_Data_Type renames Wisi.Parse_Data_Type (User_Data);
begin
case Parse_Data.Post_Parse_Action is
when Navigate =>
null;
when Face =>
null;
when Indent =>
Indent_Action_0 (Parse_Data, Tree, Nonterm, (1 => (False, (Hanging_0, (Label => None), (Int,
Ada_Indent_Broken)))));
end case;
end discrete_choice_1;
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)
is
Parse_Data : Wisi.Parse_Data_Type renames Wisi.Parse_Data_Type (User_Data);
begin
case Parse_Data.Post_Parse_Action is
when Navigate =>
null;
when Face =>
null;
when Indent =>
Indent_Action_0 (Parse_Data, Tree, Nonterm, (1 => (False, (Hanging_0, (Label => None), (Int,
Ada_Indent_Broken)))));
end case;
end discrete_choice_2;
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)
is
Parse_Data : Wisi.Parse_Data_Type renames Wisi.Parse_Data_Type (User_Data);
T1 : constant SAL.Peek_Type := 1;
T2 : constant SAL.Peek_Type := 2;
begin
case Parse_Data.Post_Parse_Action is
when Navigate =>
null;
when Face =>
null;
when Indent =>
Indent_Action_0 (Parse_Data, Tree, Nonterm, (T1 => (True, (Simple, (Label => None)), (Simple, (Language,
Ada_Indent_Record_1'Access, 83 & Integer (T2) & 0))), T2 => (False, (Simple, (Label => None)))));
end case;
end record_extension_part_0;
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)
is
Parse_Data : Wisi.Parse_Data_Type renames Wisi.Parse_Data_Type (User_Data);
T1 : constant SAL.Peek_Type := 1;
T2 : constant SAL.Peek_Type := 2;
T3 : constant SAL.Peek_Type := 3;
T4 : constant SAL.Peek_Type := 4;
T5 : constant SAL.Peek_Type := 5;
T6 : constant SAL.Peek_Type := 6;
begin
case Parse_Data.Post_Parse_Action is
when Navigate =>
Statement_Action (Parse_Data, Tree, Nonterm, ((T1, Statement_Start), (T2, Statement_Override), (T6,
Statement_End)));
when Face =>
null;
when Indent =>
Indent_Action_0 (Parse_Data, Tree, Nonterm, (T1 => (False, (Simple, (Label => None))), T2 => (False, (Simple,
(Label => None))), T3 => (False, (Simple, (Int, Ada_Indent_Subprogram_Is))), T4 => (False, (Simple, (Int,
Ada_Indent_Broken))), T5 => (False, (Simple, (Label => None))), T6 => (False, (Simple, (Int,
Ada_Indent_Broken)))));
end case;
end abstract_subprogram_declaration_0;
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)
is
Parse_Data : Wisi.Parse_Data_Type renames Wisi.Parse_Data_Type (User_Data);
T1 : constant SAL.Peek_Type := 1;
T2 : constant SAL.Peek_Type := 2;
T3 : constant SAL.Peek_Type := 3;
T4 : constant SAL.Peek_Type := 4;
T6 : constant SAL.Peek_Type := 5;
begin
case Parse_Data.Post_Parse_Action is
when Navigate =>
Statement_Action (Parse_Data, Tree, Nonterm, ((T1, Statement_Start), (T2, Statement_Override), (T6,
Statement_End)));
when Face =>
null;
when Indent =>
Indent_Action_0 (Parse_Data, Tree, Nonterm, (T1 => (False, (Simple, (Label => None))), T2 => (False, (Simple,
(Label => None))), T3 => (False, (Simple, (Int, Ada_Indent_Subprogram_Is))), T4 => (False, (Simple, (Int,
Ada_Indent_Broken))), T6 => (False, (Simple, (Int, Ada_Indent_Broken)))));
end case;
end abstract_subprogram_declaration_1;
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)
is
Parse_Data : Wisi.Parse_Data_Type renames Wisi.Parse_Data_Type (User_Data);
T2 : constant SAL.Peek_Type := 1;
T3 : constant SAL.Peek_Type := 2;
T4 : constant SAL.Peek_Type := 3;
T5 : constant SAL.Peek_Type := 4;
T6 : constant SAL.Peek_Type := 5;
begin
case Parse_Data.Post_Parse_Action is
when Navigate =>
Statement_Action (Parse_Data, Tree, Nonterm, ((T2, Statement_Override), (T6, Statement_End)));
when Face =>
null;
when Indent =>
Indent_Action_0 (Parse_Data, Tree, Nonterm, (T2 => (False, (Simple, (Label => None))), T3 => (False, (Simple,
(Int, Ada_Indent_Subprogram_Is))), T4 => (False, (Simple, (Int, Ada_Indent_Broken))), T5 => (False, (Simple,
(Label => None))), T6 => (False, (Simple, (Int, Ada_Indent_Broken)))));
end case;
end abstract_subprogram_declaration_2;
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)
is
Parse_Data : Wisi.Parse_Data_Type renames Wisi.Parse_Data_Type (User_Data);
T2 : constant SAL.Peek_Type := 1;
T3 : constant SAL.Peek_Type := 2;
T4 : constant SAL.Peek_Type := 3;
T6 : constant SAL.Peek_Type := 4;
begin
case Parse_Data.Post_Parse_Action is
when Navigate =>
Statement_Action (Parse_Data, Tree, Nonterm, ((T2, Statement_Override), (T6, Statement_End)));
when Face =>
null;
when Indent =>
Indent_Action_0 (Parse_Data, Tree, Nonterm, (T2 => (False, (Simple, (Label => None))), T3 => (False, (Simple,
(Int, Ada_Indent_Subprogram_Is))), T4 => (False, (Simple, (Int, Ada_Indent_Broken))), T6 => (False, (Simple,
(Int, Ada_Indent_Broken)))));
end case;
end abstract_subprogram_declaration_3;
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)
is
Parse_Data : Wisi.Parse_Data_Type renames Wisi.Parse_Data_Type (User_Data);
begin
case Parse_Data.Post_Parse_Action is
when Navigate =>
null;
when Face =>
Face_Apply_Action (Parse_Data, Tree, Nonterm, (1 => (1, 1, 2)));
when Indent =>
null;
end case;
end interface_list_0;
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)
is
Parse_Data : Wisi.Parse_Data_Type renames Wisi.Parse_Data_Type (User_Data);
T3 : constant SAL.Peek_Type := 3;
begin
case Parse_Data.Post_Parse_Action is
when Navigate =>
null;
when Face =>
Face_Apply_Action (Parse_Data, Tree, Nonterm, (1 => (T3, 1, 2)));
when Indent =>
null;
end case;
end interface_list_1;
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)
is
Parse_Data : Wisi.Parse_Data_Type renames Wisi.Parse_Data_Type (User_Data);
T1 : constant SAL.Peek_Type := 1;
T2 : constant SAL.Peek_Type := 2;
begin
case Parse_Data.Post_Parse_Action is
when Navigate =>
null;
when Face =>
null;
when Indent =>
Indent_Action_0 (Parse_Data, Tree, Nonterm, (T1 => (False, (Simple, (Label => None))), T2 => (False, (Simple,
(Anchored_1, T1, Ada_Indent_Broken)))));
end case;
end access_to_subprogram_definition_0;
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)
is
Parse_Data : Wisi.Parse_Data_Type renames Wisi.Parse_Data_Type (User_Data);
T1 : constant SAL.Peek_Type := 1;
T2 : constant SAL.Peek_Type := 2;
begin
case Parse_Data.Post_Parse_Action is
when Navigate =>
null;
when Face =>
null;
when Indent =>
Indent_Action_0 (Parse_Data, Tree, Nonterm, (T1 => (False, (Simple, (Label => None))), T2 => (False, (Simple,
(Anchored_1, T1, Ada_Indent_Broken)))));
end case;
end access_to_subprogram_definition_1;
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)
is
Parse_Data : Wisi.Parse_Data_Type renames Wisi.Parse_Data_Type (User_Data);
T4 : constant SAL.Peek_Type := 4;
begin
case Parse_Data.Post_Parse_Action is
when Navigate =>
null;
when Face =>
Face_Apply_Action (Parse_Data, Tree, Nonterm, (1 => (T4, 1, 2)));
when Indent =>
null;
end case;
end access_definition_0;
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)
is
Parse_Data : Wisi.Parse_Data_Type renames Wisi.Parse_Data_Type (User_Data);
T4 : constant SAL.Peek_Type := 3;
begin
case Parse_Data.Post_Parse_Action is
when Navigate =>
null;
when Face =>
Face_Apply_Action (Parse_Data, Tree, Nonterm, (1 => (T4, 1, 2)));
when Indent =>
null;
end case;
end access_definition_1;
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)
is
Parse_Data : Wisi.Parse_Data_Type renames Wisi.Parse_Data_Type (User_Data);
T4 : constant SAL.Peek_Type := 3;
begin
case Parse_Data.Post_Parse_Action is
when Navigate =>
null;
when Face =>
Face_Apply_Action (Parse_Data, Tree, Nonterm, (1 => (T4, 1, 2)));
when Indent =>
null;
end case;
end access_definition_2;
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)
is
Parse_Data : Wisi.Parse_Data_Type renames Wisi.Parse_Data_Type (User_Data);
T4 : constant SAL.Peek_Type := 2;
begin
case Parse_Data.Post_Parse_Action is
when Navigate =>
null;
when Face =>
Face_Apply_Action (Parse_Data, Tree, Nonterm, (1 => (T4, 1, 2)));
when Indent =>
null;
end case;
end access_definition_3;
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)
is
Parse_Data : Wisi.Parse_Data_Type renames Wisi.Parse_Data_Type (User_Data);
T1 : constant SAL.Peek_Type := 1;
T2 : constant SAL.Peek_Type := 2;
T3 : constant SAL.Peek_Type := 3;
T4 : constant SAL.Peek_Type := 4;
T5 : constant SAL.Peek_Type := 5;
begin
case Parse_Data.Post_Parse_Action is
when Navigate =>
null;
when Face =>
null;
when Indent =>
Indent_Action_0 (Parse_Data, Tree, Nonterm, (T1 => (False, (Simple, (Label => None))), T2 => (False, (Simple,
(Label => None))), T3 => (False, (Simple, (Label => None))), T4 => (False, (Simple, (Label => None))), T5 =>
(False, (Simple, (Anchored_1, T4, Ada_Indent_Broken)))));
end case;
end access_definition_4;
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)
is
Parse_Data : Wisi.Parse_Data_Type renames Wisi.Parse_Data_Type (User_Data);
T1 : constant SAL.Peek_Type := 1;
T2 : constant SAL.Peek_Type := 2;
T4 : constant SAL.Peek_Type := 3;
T5 : constant SAL.Peek_Type := 4;
begin
case Parse_Data.Post_Parse_Action is
when Navigate =>
null;
when Face =>
null;
when Indent =>
Indent_Action_0 (Parse_Data, Tree, Nonterm, (T1 => (False, (Simple, (Label => None))), T2 => (False, (Simple,
(Label => None))), T4 => (False, (Simple, (Label => None))), T5 => (False, (Simple, (Anchored_1, T4,
Ada_Indent_Broken)))));
end case;
end access_definition_5;
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)
is
Parse_Data : Wisi.Parse_Data_Type renames Wisi.Parse_Data_Type (User_Data);
T2 : constant SAL.Peek_Type := 1;
T3 : constant SAL.Peek_Type := 2;
T4 : constant SAL.Peek_Type := 3;
T5 : constant SAL.Peek_Type := 4;
begin
case Parse_Data.Post_Parse_Action is
when Navigate =>
null;
when Face =>
null;
when Indent =>
Indent_Action_0 (Parse_Data, Tree, Nonterm, (T2 => (False, (Simple, (Label => None))), T3 => (False, (Simple,
(Label => None))), T4 => (False, (Simple, (Label => None))), T5 => (False, (Simple, (Anchored_1, T4,
Ada_Indent_Broken)))));
end case;
end access_definition_6;
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)
is
Parse_Data : Wisi.Parse_Data_Type renames Wisi.Parse_Data_Type (User_Data);
T2 : constant SAL.Peek_Type := 1;
T4 : constant SAL.Peek_Type := 2;
T5 : constant SAL.Peek_Type := 3;
begin
case Parse_Data.Post_Parse_Action is
when Navigate =>
null;
when Face =>
null;
when Indent =>
Indent_Action_0 (Parse_Data, Tree, Nonterm, (T2 => (False, (Simple, (Label => None))), T4 => (False, (Simple,
(Label => None))), T5 => (False, (Simple, (Anchored_1, T4, Ada_Indent_Broken)))));
end case;
end access_definition_7;
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)
is
Parse_Data : Wisi.Parse_Data_Type renames Wisi.Parse_Data_Type (User_Data);
T1 : constant SAL.Peek_Type := 1;
T2 : constant SAL.Peek_Type := 2;
T3 : constant SAL.Peek_Type := 3;
T4 : constant SAL.Peek_Type := 4;
T5 : constant SAL.Peek_Type := 5;
begin
case Parse_Data.Post_Parse_Action is
when Navigate =>
null;
when Face =>
null;
when Indent =>
Indent_Action_0 (Parse_Data, Tree, Nonterm, (T1 => (False, (Simple, (Label => None))), T2 => (False, (Simple,
(Label => None))), T3 => (False, (Simple, (Label => None))), T4 => (False, (Simple, (Label => None))), T5 =>
(False, (Simple, (Anchored_1, T4, Ada_Indent_Broken)))));
end case;
end access_definition_8;
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)
is
Parse_Data : Wisi.Parse_Data_Type renames Wisi.Parse_Data_Type (User_Data);
T1 : constant SAL.Peek_Type := 1;
T2 : constant SAL.Peek_Type := 2;
T4 : constant SAL.Peek_Type := 3;
T5 : constant SAL.Peek_Type := 4;
begin
case Parse_Data.Post_Parse_Action is
when Navigate =>
null;
when Face =>
null;
when Indent =>
Indent_Action_0 (Parse_Data, Tree, Nonterm, (T1 => (False, (Simple, (Label => None))), T2 => (False, (Simple,
(Label => None))), T4 => (False, (Simple, (Label => None))), T5 => (False, (Simple, (Anchored_1, T4,
Ada_Indent_Broken)))));
end case;
end access_definition_9;
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)
is
Parse_Data : Wisi.Parse_Data_Type renames Wisi.Parse_Data_Type (User_Data);
T2 : constant SAL.Peek_Type := 1;
T3 : constant SAL.Peek_Type := 2;
T4 : constant SAL.Peek_Type := 3;
T5 : constant SAL.Peek_Type := 4;
begin
case Parse_Data.Post_Parse_Action is
when Navigate =>
null;
when Face =>
null;
when Indent =>
Indent_Action_0 (Parse_Data, Tree, Nonterm, (T2 => (False, (Simple, (Label => None))), T3 => (False, (Simple,
(Label => None))), T4 => (False, (Simple, (Label => None))), T5 => (False, (Simple, (Anchored_1, T4,
Ada_Indent_Broken)))));
end case;
end access_definition_10;
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)
is
Parse_Data : Wisi.Parse_Data_Type renames Wisi.Parse_Data_Type (User_Data);
T2 : constant SAL.Peek_Type := 1;
T4 : constant SAL.Peek_Type := 2;
T5 : constant SAL.Peek_Type := 3;
begin
case Parse_Data.Post_Parse_Action is
when Navigate =>
null;
when Face =>
null;
when Indent =>
Indent_Action_0 (Parse_Data, Tree, Nonterm, (T2 => (False, (Simple, (Label => None))), T4 => (False, (Simple,
(Label => None))), T5 => (False, (Simple, (Anchored_1, T4, Ada_Indent_Broken)))));
end case;
end access_definition_11;
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)
is
Parse_Data : Wisi.Parse_Data_Type renames Wisi.Parse_Data_Type (User_Data);
T1 : constant SAL.Peek_Type := 1;
T2 : constant SAL.Peek_Type := 2;
T3 : constant SAL.Peek_Type := 3;
T4 : constant SAL.Peek_Type := 4;
T5 : constant SAL.Peek_Type := 5;
T6 : constant SAL.Peek_Type := 6;
begin
case Parse_Data.Post_Parse_Action is
when Navigate =>
Statement_Action (Parse_Data, Tree, Nonterm, ((T1, Statement_Start), (T6, Statement_End)));
Name_Action (Parse_Data, Tree, Nonterm, T2);
when Face =>
Face_Apply_Action (Parse_Data, Tree, Nonterm, (1 => (T2, 3, 2)));
when Indent =>
Indent_Action_0 (Parse_Data, Tree, Nonterm, (T1 => (False, (Simple, (Label => None))), T2 => (False, (Simple,
(Int, Ada_Indent_Broken))), T3 => (False, (Simple, (Int, Ada_Indent_Broken))), T4 => (False, (Simple, (Int,
Ada_Indent_Broken))), T5 => (False, (Simple, (Int, Ada_Indent_Broken))), T6 => (False, (Simple, (Int,
Ada_Indent_Broken)))));
end case;
end incomplete_type_declaration_0;
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)
is
Parse_Data : Wisi.Parse_Data_Type renames Wisi.Parse_Data_Type (User_Data);
T1 : constant SAL.Peek_Type := 1;
T2 : constant SAL.Peek_Type := 2;
T3 : constant SAL.Peek_Type := 3;
T6 : constant SAL.Peek_Type := 4;
begin
case Parse_Data.Post_Parse_Action is
when Navigate =>
Statement_Action (Parse_Data, Tree, Nonterm, ((T1, Statement_Start), (T6, Statement_End)));
Name_Action (Parse_Data, Tree, Nonterm, T2);
when Face =>
Face_Apply_Action (Parse_Data, Tree, Nonterm, (1 => (T2, 3, 2)));
when Indent =>
Indent_Action_0 (Parse_Data, Tree, Nonterm, (T1 => (False, (Simple, (Label => None))), T2 => (False, (Simple,
(Int, Ada_Indent_Broken))), T3 => (False, (Simple, (Int, Ada_Indent_Broken))), T6 => (False, (Simple, (Int,
Ada_Indent_Broken)))));
end case;
end incomplete_type_declaration_1;
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)
is
Parse_Data : Wisi.Parse_Data_Type renames Wisi.Parse_Data_Type (User_Data);
T1 : constant SAL.Peek_Type := 1;
T2 : constant SAL.Peek_Type := 2;
T4 : constant SAL.Peek_Type := 3;
T5 : constant SAL.Peek_Type := 4;
T6 : constant SAL.Peek_Type := 5;
begin
case Parse_Data.Post_Parse_Action is
when Navigate =>
Statement_Action (Parse_Data, Tree, Nonterm, ((T1, Statement_Start), (T6, Statement_End)));
Name_Action (Parse_Data, Tree, Nonterm, T2);
when Face =>
Face_Apply_Action (Parse_Data, Tree, Nonterm, (1 => (T2, 3, 2)));
when Indent =>
Indent_Action_0 (Parse_Data, Tree, Nonterm, (T1 => (False, (Simple, (Label => None))), T2 => (False, (Simple,
(Int, Ada_Indent_Broken))), T4 => (False, (Simple, (Int, Ada_Indent_Broken))), T5 => (False, (Simple, (Int,
Ada_Indent_Broken))), T6 => (False, (Simple, (Int, Ada_Indent_Broken)))));
end case;
end incomplete_type_declaration_2;
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)
is
Parse_Data : Wisi.Parse_Data_Type renames Wisi.Parse_Data_Type (User_Data);
T1 : constant SAL.Peek_Type := 1;
T2 : constant SAL.Peek_Type := 2;
T6 : constant SAL.Peek_Type := 3;
begin
case Parse_Data.Post_Parse_Action is
when Navigate =>
Statement_Action (Parse_Data, Tree, Nonterm, ((T1, Statement_Start), (T6, Statement_End)));
Name_Action (Parse_Data, Tree, Nonterm, T2);
when Face =>
Face_Apply_Action (Parse_Data, Tree, Nonterm, (1 => (T2, 3, 2)));
when Indent =>
Indent_Action_0 (Parse_Data, Tree, Nonterm, (T1 => (False, (Simple, (Label => None))), T2 => (False, (Simple,
(Int, Ada_Indent_Broken))), T6 => (False, (Simple, (Int, Ada_Indent_Broken)))));
end case;
end incomplete_type_declaration_3;
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
is
pragma Unreferenced (Recover_Active);
begin
return Propagate_Name (Tree, Nonterm, Tokens, 1);
end name_0_check;
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
is
pragma Unreferenced (Recover_Active);
begin
return Propagate_Name (Tree, Nonterm, Tokens, 1);
end name_3_check;
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)
is
Parse_Data : Wisi.Parse_Data_Type renames Wisi.Parse_Data_Type (User_Data);
begin
case Parse_Data.Post_Parse_Action is
when Navigate =>
null;
when Face =>
Face_Mark_Action (Parse_Data, Tree, Nonterm, (1 => (1, Suffix)));
when Indent =>
null;
end case;
end direct_name_0;
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
is
pragma Unreferenced (Recover_Active);
begin
return Propagate_Name (Tree, Nonterm, Tokens, 1);
end direct_name_0_check;
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
is
pragma Unreferenced (Recover_Active);
begin
return Propagate_Name (Tree, Nonterm, Tokens, 1);
end direct_name_1_check;
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)
is
Parse_Data : Wisi.Parse_Data_Type renames Wisi.Parse_Data_Type (User_Data);
T1 : constant SAL.Peek_Type := 1;
T2 : constant SAL.Peek_Type := 2;
T3 : constant SAL.Peek_Type := 3;
T4 : constant SAL.Peek_Type := 4;
begin
case Parse_Data.Post_Parse_Action is
when Navigate =>
null;
when Face =>
null;
when Indent =>
Indent_Action_0 (Parse_Data, Tree, Nonterm, (T1 => (False, (Simple, (Label => None))), T2 => (False, (Simple,
(Label => None))), T3 => (False, (Simple, (Anchored_0, T2, 1))), T4 => (False, (Simple, (Anchored_0, T2,
0)))));
end case;
end slice_0;
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)
is
Parse_Data : Wisi.Parse_Data_Type renames Wisi.Parse_Data_Type (User_Data);
T1 : constant SAL.Peek_Type := 1;
T3 : constant SAL.Peek_Type := 3;
begin
case Parse_Data.Post_Parse_Action is
when Navigate =>
null;
when Face =>
Face_Mark_Action (Parse_Data, Tree, Nonterm, ((T1, Prefix), (T3, Suffix)));
when Indent =>
null;
end case;
end selected_component_0;
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
is
pragma Unreferenced (Recover_Active);
T1 : constant SAL.Peek_Type := 1;
T3 : constant SAL.Peek_Type := 3;
begin
return Merge_Names (Tree, Nonterm, Tokens, T1, T3);
end selected_component_0_check;
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)
is
Parse_Data : Wisi.Parse_Data_Type renames Wisi.Parse_Data_Type (User_Data);
T1 : constant SAL.Peek_Type := 1;
T2 : constant SAL.Peek_Type := 2;
T3 : constant SAL.Peek_Type := 3;
T4 : constant SAL.Peek_Type := 4;
begin
case Parse_Data.Post_Parse_Action is
when Navigate =>
null;
when Face =>
null;
when Indent =>
Indent_Action_0 (Parse_Data, Tree, Nonterm, (T1 => (False, (Simple, (Label => None))), T2 => (False, (Simple,
(Int, Ada_Indent_Broken))), T3 => (False, (Hanging_0, (Anchored_0, T2, 1), (Anchored_0, T2, 1 +
Ada_Indent_Broken))), T4 => (False, (Simple, (Anchored_0, T2, 0)))));
end case;
end range_attribute_designator_0;
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)
is
Parse_Data : Wisi.Parse_Data_Type renames Wisi.Parse_Data_Type (User_Data);
T1 : constant SAL.Peek_Type := 1;
begin
case Parse_Data.Post_Parse_Action is
when Navigate =>
null;
when Face =>
null;
when Indent =>
Indent_Action_0 (Parse_Data, Tree, Nonterm, (T1 => (False, (Simple, (Label => None)))));
end case;
end range_attribute_designator_1;
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)
is
Parse_Data : Wisi.Parse_Data_Type renames Wisi.Parse_Data_Type (User_Data);
T1 : constant SAL.Peek_Type := 1;
T2 : constant SAL.Peek_Type := 2;
T3 : constant SAL.Peek_Type := 3;
begin
case Parse_Data.Post_Parse_Action is
when Navigate =>
null;
when Face =>
null;
when Indent =>
Indent_Action_0 (Parse_Data, Tree, Nonterm, (T1 => (False, (Simple, (Label => None))), T2 => (True, (Simple,
(Anchored_0, T1, 1)), (Simple, (Anchored_0, T1, 1))), T3 => (False, (Simple, (Anchored_0, T1, 0)))));
end case;
end aggregate_4;
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)
is
Parse_Data : Wisi.Parse_Data_Type renames Wisi.Parse_Data_Type (User_Data);
T1 : constant SAL.Peek_Type := 1;
T2 : constant SAL.Peek_Type := 2;
T3 : constant SAL.Peek_Type := 3;
begin
case Parse_Data.Post_Parse_Action is
when Navigate =>
null;
when Face =>
null;
when Indent =>
Indent_Action_0 (Parse_Data, Tree, Nonterm, (T1 => (False, (Simple, (Label => None))), T2 => (True, (Simple,
(Anchored_0, T1, 1)), (Simple, (Anchored_0, T1, 1))), T3 => (False, (Simple, (Anchored_0, T1, 0)))));
end case;
end aggregate_5;
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)
is
Parse_Data : Wisi.Parse_Data_Type renames Wisi.Parse_Data_Type (User_Data);
T1 : constant SAL.Peek_Type := 1;
T2 : constant SAL.Peek_Type := 2;
T3 : constant SAL.Peek_Type := 3;
begin
case Parse_Data.Post_Parse_Action is
when Navigate =>
null;
when Face =>
null;
when Indent =>
Indent_Action_0 (Parse_Data, Tree, Nonterm, (T1 => (False, (Simple, (Label => None))), T2 => (True, (Simple,
(Anchored_0, T1, 1)), (Simple, (Anchored_0, T1, 1))), T3 => (False, (Simple, (Anchored_0, T1, 0)))));
end case;
end aggregate_6;
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)
is
Parse_Data : Wisi.Parse_Data_Type renames Wisi.Parse_Data_Type (User_Data);
T1 : constant SAL.Peek_Type := 1;
T2 : constant SAL.Peek_Type := 2;
T3 : constant SAL.Peek_Type := 3;
begin
case Parse_Data.Post_Parse_Action is
when Navigate =>
null;
when Face =>
null;
when Indent =>
Indent_Action_0 (Parse_Data, Tree, Nonterm, (T1 => (False, (Simple, (Label => None))), T2 => (True, (Simple,
(Anchored_0, T1, 1)), (Simple, (Anchored_0, T1, 1))), T3 => (False, (Simple, (Anchored_0, T1, 0)))));
end case;
end record_aggregate_0;
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)
is
Parse_Data : Wisi.Parse_Data_Type renames Wisi.Parse_Data_Type (User_Data);
begin
case Parse_Data.Post_Parse_Action is
when Navigate =>
null;
when Face =>
null;
when Indent =>
Indent_Action_0 (Parse_Data, Tree, Nonterm, ((False, (Simple, (Label => None))), (False, (Simple, (Int,
Ada_Indent_Broken)))));
end case;
end record_component_association_0;
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)
is
Parse_Data : Wisi.Parse_Data_Type renames Wisi.Parse_Data_Type (User_Data);
begin
case Parse_Data.Post_Parse_Action is
when Navigate =>
null;
when Face =>
null;
when Indent =>
Indent_Action_0 (Parse_Data, Tree, Nonterm, (1 => (False, (Hanging_0, (Label => None), (Int,
Ada_Indent_Broken)))));
end case;
end record_component_association_1;
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)
is
Parse_Data : Wisi.Parse_Data_Type renames Wisi.Parse_Data_Type (User_Data);
T1 : constant SAL.Peek_Type := 1;
T2 : constant SAL.Peek_Type := 2;
T3 : constant SAL.Peek_Type := 3;
begin
case Parse_Data.Post_Parse_Action is
when Navigate =>
null;
when Face =>
null;
when Indent =>
Indent_Action_0 (Parse_Data, Tree, Nonterm, (T1 => (False, (Simple, (Label => None))), T2 => (False, (Simple,
(Label => None))), T3 => (False, (Simple, (Int, Ada_Indent_Broken)))));
end case;
end component_choice_list_1;
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)
is
Parse_Data : Wisi.Parse_Data_Type renames Wisi.Parse_Data_Type (User_Data);
T1 : constant SAL.Peek_Type := 1;
T2 : constant SAL.Peek_Type := 2;
T3 : constant SAL.Peek_Type := 3;
T4 : constant SAL.Peek_Type := 4;
T5 : constant SAL.Peek_Type := 5;
begin
case Parse_Data.Post_Parse_Action is
when Navigate =>
null;
when Face =>
null;
when Indent =>
Indent_Action_0 (Parse_Data, Tree, Nonterm, (T1 => (False, (Simple, (Label => None))), T2 => (False,
(Hanging_0, (Anchored_0, T1, 1), (Anchored_0, T1, 1 + Ada_Indent_Broken))), T3 => (False, (Simple,
(Anchored_0, T1, 1))), T4 => (True, (Simple, (Anchored_0, T1, 1)), (Simple, (Anchored_0, T1, 1))), T5 =>
(False, (Simple, (Anchored_0, T1, 0)))));
end case;
end extension_aggregate_0;
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)
is
Parse_Data : Wisi.Parse_Data_Type renames Wisi.Parse_Data_Type (User_Data);
begin
case Parse_Data.Post_Parse_Action is
when Navigate =>
null;
when Face =>
null;
when Indent =>
Indent_Action_0 (Parse_Data, Tree, Nonterm, (1 => (True, (Hanging_0, (Label => None), (Int,
Ada_Indent_Broken)), (Hanging_0, (Label => None), (Int, Ada_Indent_Broken)))));
end case;
end expression_list_0;
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)
is
Parse_Data : Wisi.Parse_Data_Type renames Wisi.Parse_Data_Type (User_Data);
T1 : constant SAL.Peek_Type := 1;
T2 : constant SAL.Peek_Type := 2;
T3 : constant SAL.Peek_Type := 3;
begin
case Parse_Data.Post_Parse_Action is
when Navigate =>
null;
when Face =>
null;
when Indent =>
Indent_Action_0 (Parse_Data, Tree, Nonterm, (T1 => (False, (Simple, (Label => None))), T2 => (False, (Simple,
(Label => None))), T3 => (True, (Hanging_0, (Label => None), (Int, Ada_Indent_Broken)), (Hanging_0, (Label =>
None), (Int, Ada_Indent_Broken)))));
end case;
end expression_list_1;
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)
is
Parse_Data : Wisi.Parse_Data_Type renames Wisi.Parse_Data_Type (User_Data);
T1 : constant SAL.Peek_Type := 1;
T2 : constant SAL.Peek_Type := 2;
T3 : constant SAL.Peek_Type := 3;
begin
case Parse_Data.Post_Parse_Action is
when Navigate =>
null;
when Face =>
null;
when Indent =>
Indent_Action_0 (Parse_Data, Tree, Nonterm, (T1 => (False, (Simple, (Label => None))), T2 => (True, (Simple,
(Anchored_0, T1, 1)), (Simple, (Anchored_0, T1, 1))), T3 => (False, (Simple, (Anchored_0, T1, 0)))));
end case;
end positional_array_aggregate_0;
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)
is
Parse_Data : Wisi.Parse_Data_Type renames Wisi.Parse_Data_Type (User_Data);
T1 : constant SAL.Peek_Type := 1;
T2 : constant SAL.Peek_Type := 2;
T3 : constant SAL.Peek_Type := 3;
T4 : constant SAL.Peek_Type := 4;
T5 : constant SAL.Peek_Type := 5;
T6 : constant SAL.Peek_Type := 6;
begin
case Parse_Data.Post_Parse_Action is
when Navigate =>
null;
when Face =>
null;
when Indent =>
Indent_Action_0 (Parse_Data, Tree, Nonterm, (T1 => (False, (Simple, (Label => None))), T2 => (False, (Simple,
(Anchored_0, T1, 1))), T3 => (False, (Simple, (Label => None))), T4 => (False, (Simple, (Anchored_0, T1, 1))),
T5 => (False, (Simple, (Anchored_0, T1, 1 + Ada_Indent_Broken))), T6 => (False, (Simple, (Anchored_0, T1,
0)))));
end case;
end positional_array_aggregate_1;
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)
is
Parse_Data : Wisi.Parse_Data_Type renames Wisi.Parse_Data_Type (User_Data);
T1 : constant SAL.Peek_Type := 1;
T2 : constant SAL.Peek_Type := 2;
T3 : constant SAL.Peek_Type := 3;
T4 : constant SAL.Peek_Type := 4;
T5 : constant SAL.Peek_Type := 5;
T6 : constant SAL.Peek_Type := 6;
begin
case Parse_Data.Post_Parse_Action is
when Navigate =>
null;
when Face =>
null;
when Indent =>
Indent_Action_0 (Parse_Data, Tree, Nonterm, (T1 => (False, (Simple, (Label => None))), T2 => (False, (Simple,
(Anchored_0, T1, 1))), T3 => (False, (Simple, (Label => None))), T4 => (False, (Simple, (Anchored_0, T1, 1))),
T5 => (False, (Simple, (Anchored_0, T1, 1 + Ada_Indent_Broken))), T6 => (False, (Simple, (Anchored_0, T1,
0)))));
end case;
end positional_array_aggregate_2;
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)
is
Parse_Data : Wisi.Parse_Data_Type renames Wisi.Parse_Data_Type (User_Data);
T1 : constant SAL.Peek_Type := 1;
T2 : constant SAL.Peek_Type := 2;
T6 : constant SAL.Peek_Type := 3;
begin
case Parse_Data.Post_Parse_Action is
when Navigate =>
null;
when Face =>
null;
when Indent =>
Indent_Action_0 (Parse_Data, Tree, Nonterm, (T1 => (False, (Simple, (Label => None))), T2 => (False, (Simple,
(Anchored_0, T1, 1))), T6 => (False, (Simple, (Anchored_0, T1, 0)))));
end case;
end positional_array_aggregate_3;
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)
is
Parse_Data : Wisi.Parse_Data_Type renames Wisi.Parse_Data_Type (User_Data);
T1 : constant SAL.Peek_Type := 1;
T2 : constant SAL.Peek_Type := 2;
T3 : constant SAL.Peek_Type := 3;
begin
case Parse_Data.Post_Parse_Action is
when Navigate =>
null;
when Face =>
null;
when Indent =>
Indent_Action_0 (Parse_Data, Tree, Nonterm, (T1 => (False, (Simple, (Label => None))), T2 => (True, (Simple,
(Anchored_0, T1, 1)), (Simple, (Anchored_0, T1, 1))), T3 => (False, (Simple, (Anchored_0, T1, 0)))));
end case;
end named_array_aggregate_0;
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)
is
Parse_Data : Wisi.Parse_Data_Type renames Wisi.Parse_Data_Type (User_Data);
T1 : constant SAL.Peek_Type := 1;
T2 : constant SAL.Peek_Type := 2;
T3 : constant SAL.Peek_Type := 3;
begin
case Parse_Data.Post_Parse_Action is
when Navigate =>
null;
when Face =>
null;
when Indent =>
Indent_Action_0 (Parse_Data, Tree, Nonterm, (T1 => (False, (Simple, (Label => None))), T2 => (True, (Simple,
(Anchored_0, T1, 1)), (Simple, (Anchored_0, T1, 1))), T3 => (False, (Simple, (Anchored_0, T1, 0)))));
end case;
end named_array_aggregate_1;
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)
is
Parse_Data : Wisi.Parse_Data_Type renames Wisi.Parse_Data_Type (User_Data);
begin
case Parse_Data.Post_Parse_Action is
when Navigate =>
null;
when Face =>
null;
when Indent =>
Indent_Action_0 (Parse_Data, Tree, Nonterm, ((False, (Hanging_0, (Label => None), (Int, Ada_Indent_Broken))),
(False, (Simple, (Int, Ada_Indent_Broken)))));
end case;
end array_component_association_0;
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)
is
Parse_Data : Wisi.Parse_Data_Type renames Wisi.Parse_Data_Type (User_Data);
T1 : constant SAL.Peek_Type := 1;
T2 : constant SAL.Peek_Type := 2;
T3 : constant SAL.Peek_Type := 3;
T4 : constant SAL.Peek_Type := 4;
T5 : constant SAL.Peek_Type := 5;
T6 : constant SAL.Peek_Type := 6;
begin
case Parse_Data.Post_Parse_Action is
when Navigate =>
null;
when Face =>
null;
when Indent =>
Indent_Action_0 (Parse_Data, Tree, Nonterm, (T1 => (False, (Simple, (Label => None))), T2 => (False,
(Hanging_0, (Anchored_0, T1, 1), (Anchored_0, T1, 1 + Ada_Indent_Broken))), T3 => (False, (Simple,
(Anchored_0, T1, 1))), T4 => (False, (Simple, (Anchored_0, T1, 1))), T5 => (True, (Simple, (Anchored_0, T1,
1)), (Simple, (Anchored_0, T1, 1))), T6 => (False, (Simple, (Anchored_0, T1, 0)))));
end case;
end record_delta_aggregate_0;
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)
is
Parse_Data : Wisi.Parse_Data_Type renames Wisi.Parse_Data_Type (User_Data);
T1 : constant SAL.Peek_Type := 1;
T2 : constant SAL.Peek_Type := 2;
T3 : constant SAL.Peek_Type := 3;
T4 : constant SAL.Peek_Type := 4;
T5 : constant SAL.Peek_Type := 5;
T6 : constant SAL.Peek_Type := 6;
begin
case Parse_Data.Post_Parse_Action is
when Navigate =>
null;
when Face =>
null;
when Indent =>
Indent_Action_0 (Parse_Data, Tree, Nonterm, (T1 => (False, (Simple, (Label => None))), T2 => (False,
(Hanging_0, (Anchored_0, T1, 1), (Anchored_0, T1, 1 + Ada_Indent_Broken))), T3 => (False, (Simple,
(Anchored_0, T1, 1))), T4 => (False, (Simple, (Anchored_0, T1, 1))), T5 => (True, (Simple, (Anchored_0, T1,
1)), (Simple, (Anchored_0, T1, 1))), T6 => (False, (Simple, (Anchored_0, T1, 0)))));
end case;
end array_delta_aggregate_0;
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)
is
Parse_Data : Wisi.Parse_Data_Type renames Wisi.Parse_Data_Type (User_Data);
T1 : constant SAL.Peek_Type := 1;
T2 : constant SAL.Peek_Type := 2;
T3 : constant SAL.Peek_Type := 3;
T4 : constant SAL.Peek_Type := 4;
T5 : constant SAL.Peek_Type := 5;
T6 : constant SAL.Peek_Type := 6;
begin
case Parse_Data.Post_Parse_Action is
when Navigate =>
null;
when Face =>
null;
when Indent =>
Indent_Action_0 (Parse_Data, Tree, Nonterm, (T1 => (False, (Simple, (Label => None))), T2 => (False,
(Hanging_0, (Anchored_0, T1, 1), (Anchored_0, T1, 1 + Ada_Indent_Broken))), T3 => (False, (Simple,
(Anchored_0, T1, 1))), T4 => (False, (Simple, (Anchored_0, T1, 1))), T5 => (True, (Simple, (Anchored_0, T1,
1)), (Simple, (Anchored_0, T1, 1))), T6 => (False, (Simple, (Anchored_0, T1, 0)))));
end case;
end array_delta_aggregate_1;
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)
is
Parse_Data : Wisi.Parse_Data_Type renames Wisi.Parse_Data_Type (User_Data);
T1 : constant SAL.Peek_Type := 1;
T2 : constant SAL.Peek_Type := 2;
T3 : constant SAL.Peek_Type := 3;
T4 : constant SAL.Peek_Type := 4;
T5 : constant SAL.Peek_Type := 5;
begin
case Parse_Data.Post_Parse_Action is
when Navigate =>
null;
when Face =>
null;
when Indent =>
Indent_Action_0 (Parse_Data, Tree, Nonterm, (T1 => (False, (Simple, (Label => None))), T2 => (False, (Simple,
(Int, Ada_Indent_Broken))), T3 => (False, (Simple, (Int, Ada_Indent_Broken))), T4 => (False, (Hanging_2, (Int,
Ada_Indent_Broken), (Int, Ada_Indent_Broken))), T5 => (False, (Simple, (Int, Ada_Indent_Broken)))));
end case;
end iterated_element_association_0;
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)
is
Parse_Data : Wisi.Parse_Data_Type renames Wisi.Parse_Data_Type (User_Data);
T1 : constant SAL.Peek_Type := 1;
T2 : constant SAL.Peek_Type := 2;
T5 : constant SAL.Peek_Type := 3;
begin
case Parse_Data.Post_Parse_Action is
when Navigate =>
null;
when Face =>
null;
when Indent =>
Indent_Action_0 (Parse_Data, Tree, Nonterm, (T1 => (False, (Simple, (Label => None))), T2 => (False, (Simple,
(Int, Ada_Indent_Broken))), T5 => (False, (Simple, (Int, Ada_Indent_Broken)))));
end case;
end iterated_element_association_1;
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)
is
Parse_Data : Wisi.Parse_Data_Type renames Wisi.Parse_Data_Type (User_Data);
T1 : constant SAL.Peek_Type := 1;
T2 : constant SAL.Peek_Type := 2;
T3 : constant SAL.Peek_Type := 3;
T4 : constant SAL.Peek_Type := 4;
T5 : constant SAL.Peek_Type := 5;
begin
case Parse_Data.Post_Parse_Action is
when Navigate =>
null;
when Face =>
null;
when Indent =>
Indent_Action_0 (Parse_Data, Tree, Nonterm, (T1 => (False, (Simple, (Label => None))), T2 => (False, (Simple,
(Int, Ada_Indent_Broken))), T3 => (False, (Simple, (Int, Ada_Indent_Broken))), T4 => (False, (Hanging_2, (Int,
Ada_Indent_Broken), (Int, Ada_Indent_Broken))), T5 => (False, (Simple, (Int, Ada_Indent_Broken)))));
end case;
end iterated_element_association_2;
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)
is
Parse_Data : Wisi.Parse_Data_Type renames Wisi.Parse_Data_Type (User_Data);
T1 : constant SAL.Peek_Type := 1;
T2 : constant SAL.Peek_Type := 2;
T5 : constant SAL.Peek_Type := 3;
begin
case Parse_Data.Post_Parse_Action is
when Navigate =>
null;
when Face =>
null;
when Indent =>
Indent_Action_0 (Parse_Data, Tree, Nonterm, (T1 => (False, (Simple, (Label => None))), T2 => (False, (Simple,
(Int, Ada_Indent_Broken))), T5 => (False, (Simple, (Int, Ada_Indent_Broken)))));
end case;
end iterated_element_association_3;
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)
is
Parse_Data : Wisi.Parse_Data_Type renames Wisi.Parse_Data_Type (User_Data);
begin
case Parse_Data.Post_Parse_Action is
when Navigate =>
null;
when Face =>
null;
when Indent =>
Indent_Action_0 (Parse_Data, Tree, Nonterm, (1 => (False, (Hanging_0, (Label => None), (Int,
Ada_Indent_Broken)))));
end case;
end membership_choice_0;
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)
is
Parse_Data : Wisi.Parse_Data_Type renames Wisi.Parse_Data_Type (User_Data);
begin
case Parse_Data.Post_Parse_Action is
when Navigate =>
null;
when Face =>
null;
when Indent =>
Indent_Action_0 (Parse_Data, Tree, Nonterm, (1 => (False, (Hanging_0, (Label => None), (Int,
Ada_Indent_Broken)))));
end case;
end membership_choice_1;
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)
is
Parse_Data : Wisi.Parse_Data_Type renames Wisi.Parse_Data_Type (User_Data);
begin
case Parse_Data.Post_Parse_Action is
when Navigate =>
null;
when Face =>
Face_Apply_Action (Parse_Data, Tree, Nonterm, (1 => (1, 3, 0)));
when Indent =>
null;
end case;
end primary_0;
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)
is
Parse_Data : Wisi.Parse_Data_Type renames Wisi.Parse_Data_Type (User_Data);
begin
case Parse_Data.Post_Parse_Action is
when Navigate =>
null;
when Face =>
null;
when Indent =>
Indent_Action_0 (Parse_Data, Tree, Nonterm, (1 => (False, (Simple, (Language, Ada_Indent_Aggregate'Access,
Null_Args)))));
end case;
end primary_2;
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)
is
Parse_Data : Wisi.Parse_Data_Type renames Wisi.Parse_Data_Type (User_Data);
T1 : constant SAL.Peek_Type := 1;
T2 : constant SAL.Peek_Type := 2;
T3 : constant SAL.Peek_Type := 3;
T4 : constant SAL.Peek_Type := 4;
begin
case Parse_Data.Post_Parse_Action is
when Navigate =>
Statement_Action (Parse_Data, Tree, Nonterm, ((T1, Motion), (T3, Motion)));
Motion_Action (Parse_Data, Tree, Nonterm, (Index_ID'(T1, Invalid_Token_ID) & Index_ID'(T3,
Invalid_Token_ID)));
when Face =>
null;
when Indent =>
Indent_Action_0 (Parse_Data, Tree, Nonterm, (T1 => (False, (Simple, (Label => None))), T2 => (True, (Simple,
(Int, Ada_Indent_Broken)), (Simple, (Int, Ada_Indent_Broken))), T3 => (False, (Simple, (Label => None))), T4
=> (False, (Hanging_2, (Int, Ada_Indent), (Int, Ada_Indent_Broken)))));
end case;
end elsif_expression_item_0;
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)
is
Parse_Data : Wisi.Parse_Data_Type renames Wisi.Parse_Data_Type (User_Data);
begin
case Parse_Data.Post_Parse_Action is
when Navigate =>
Motion_Action (Parse_Data, Tree, Nonterm, (Index_ID'(1, Invalid_Token_ID) & Index_ID'(2, Invalid_Token_ID)));
when Face =>
null;
when Indent =>
null;
end case;
end elsif_expression_list_1;
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)
is
Parse_Data : Wisi.Parse_Data_Type renames Wisi.Parse_Data_Type (User_Data);
T1 : constant SAL.Peek_Type := 1;
T2 : constant SAL.Peek_Type := 2;
T3 : constant SAL.Peek_Type := 3;
T4 : constant SAL.Peek_Type := 4;
T5 : constant SAL.Peek_Type := 5;
T6 : constant SAL.Peek_Type := 6;
T7 : constant SAL.Peek_Type := 7;
begin
case Parse_Data.Post_Parse_Action is
when Navigate =>
Statement_Action (Parse_Data, Tree, Nonterm, ((T1, Motion), (T3, Motion), (T6, Motion)));
Motion_Action (Parse_Data, Tree, Nonterm, (Index_ID'(T1, Invalid_Token_ID) & Index_ID'(T3, Invalid_Token_ID) &
Index_ID'(T5, Invalid_Token_ID) & Index_ID'(T6, Invalid_Token_ID)));
when Face =>
null;
when Indent =>
Indent_Action_0 (Parse_Data, Tree, Nonterm, (T1 => (False, (Simple, (Label => None))), T2 => (True,
(Hanging_2, (Int, Ada_Indent_Broken), (Int, Ada_Indent_Broken)), (Simple, (Int, Ada_Indent_Broken))), T3 =>
(False, (Simple, (Label => None))), T4 => (False, (Hanging_2, (Int, Ada_Indent), (Int, Ada_Indent_Broken))),
T5 => (False, (Simple, (Label => None))), T6 => (False, (Simple, (Label => None))), T7 => (False, (Hanging_2,
(Int, Ada_Indent), (Int, Ada_Indent_Broken)))));
end case;
end if_expression_0;
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)
is
Parse_Data : Wisi.Parse_Data_Type renames Wisi.Parse_Data_Type (User_Data);
T1 : constant SAL.Peek_Type := 1;
T2 : constant SAL.Peek_Type := 2;
T3 : constant SAL.Peek_Type := 3;
T4 : constant SAL.Peek_Type := 4;
T5 : constant SAL.Peek_Type := 5;
begin
case Parse_Data.Post_Parse_Action is
when Navigate =>
Statement_Action (Parse_Data, Tree, Nonterm, ((T1, Motion), (T3, Motion)));
Motion_Action (Parse_Data, Tree, Nonterm, (Index_ID'(T1, Invalid_Token_ID) & Index_ID'(T3, Invalid_Token_ID) &
Index_ID'(T5, Invalid_Token_ID)));
when Face =>
null;
when Indent =>
Indent_Action_0 (Parse_Data, Tree, Nonterm, (T1 => (False, (Simple, (Label => None))), T2 => (True,
(Hanging_2, (Int, Ada_Indent_Broken), (Int, Ada_Indent_Broken)), (Simple, (Int, Ada_Indent_Broken))), T3 =>
(False, (Simple, (Label => None))), T4 => (False, (Hanging_2, (Int, Ada_Indent), (Int, Ada_Indent_Broken))),
T5 => (False, (Simple, (Label => None)))));
end case;
end if_expression_1;
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)
is
Parse_Data : Wisi.Parse_Data_Type renames Wisi.Parse_Data_Type (User_Data);
T1 : constant SAL.Peek_Type := 1;
T2 : constant SAL.Peek_Type := 2;
T3 : constant SAL.Peek_Type := 3;
T4 : constant SAL.Peek_Type := 4;
T6 : constant SAL.Peek_Type := 5;
T7 : constant SAL.Peek_Type := 6;
begin
case Parse_Data.Post_Parse_Action is
when Navigate =>
Statement_Action (Parse_Data, Tree, Nonterm, ((T1, Motion), (T3, Motion), (T6, Motion)));
Motion_Action (Parse_Data, Tree, Nonterm, (Index_ID'(T1, Invalid_Token_ID) & Index_ID'(T3, Invalid_Token_ID) &
Index_ID'(T6, Invalid_Token_ID)));
when Face =>
null;
when Indent =>
Indent_Action_0 (Parse_Data, Tree, Nonterm, (T1 => (False, (Simple, (Label => None))), T2 => (True,
(Hanging_2, (Int, Ada_Indent_Broken), (Int, Ada_Indent_Broken)), (Simple, (Int, Ada_Indent_Broken))), T3 =>
(False, (Simple, (Label => None))), T4 => (False, (Hanging_2, (Int, Ada_Indent), (Int, Ada_Indent_Broken))),
T6 => (False, (Simple, (Label => None))), T7 => (False, (Hanging_2, (Int, Ada_Indent), (Int,
Ada_Indent_Broken)))));
end case;
end if_expression_2;
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)
is
Parse_Data : Wisi.Parse_Data_Type renames Wisi.Parse_Data_Type (User_Data);
T1 : constant SAL.Peek_Type := 1;
T2 : constant SAL.Peek_Type := 2;
T3 : constant SAL.Peek_Type := 3;
T4 : constant SAL.Peek_Type := 4;
begin
case Parse_Data.Post_Parse_Action is
when Navigate =>
Statement_Action (Parse_Data, Tree, Nonterm, ((T1, Motion), (T3, Motion)));
Motion_Action (Parse_Data, Tree, Nonterm, (Index_ID'(T1, Invalid_Token_ID) & Index_ID'(T3,
Invalid_Token_ID)));
when Face =>
null;
when Indent =>
Indent_Action_0 (Parse_Data, Tree, Nonterm, (T1 => (False, (Simple, (Label => None))), T2 => (True,
(Hanging_2, (Int, Ada_Indent_Broken), (Int, Ada_Indent_Broken)), (Simple, (Int, Ada_Indent_Broken))), T3 =>
(False, (Simple, (Label => None))), T4 => (False, (Hanging_2, (Int, Ada_Indent), (Int, Ada_Indent_Broken)))));
end case;
end if_expression_3;
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)
is
Parse_Data : Wisi.Parse_Data_Type renames Wisi.Parse_Data_Type (User_Data);
T1 : constant SAL.Peek_Type := 1;
T3 : constant SAL.Peek_Type := 3;
begin
case Parse_Data.Post_Parse_Action is
when Navigate =>
Motion_Action (Parse_Data, Tree, Nonterm, (Index_ID'(T1, Invalid_Token_ID) & Index_ID'(T3,
Invalid_Token_ID)));
when Face =>
null;
when Indent =>
null;
end case;
end case_expression_alternative_list_1;
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)
is
Parse_Data : Wisi.Parse_Data_Type renames Wisi.Parse_Data_Type (User_Data);
T1 : constant SAL.Peek_Type := 1;
T2 : constant SAL.Peek_Type := 2;
T3 : constant SAL.Peek_Type := 3;
T4 : constant SAL.Peek_Type := 4;
begin
case Parse_Data.Post_Parse_Action is
when Navigate =>
Statement_Action (Parse_Data, Tree, Nonterm, (1 => (T1, Motion)));
Motion_Action (Parse_Data, Tree, Nonterm, (Index_ID'(T1, Invalid_Token_ID) & Index_ID'(T4,
Invalid_Token_ID)));
when Face =>
null;
when Indent =>
Indent_Action_0 (Parse_Data, Tree, Nonterm, (T1 => (False, (Simple, (Label => None))), T2 => (True,
(Hanging_2, (Int, Ada_Indent_Broken), (Int, Ada_Indent_Broken)), (Simple, (Int, Ada_Indent_Broken))), T3 =>
(False, (Simple, (Label => None))), T4 => (False, (Simple, (Int, Ada_Indent_When)))));
end case;
end case_expression_0;
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)
is
Parse_Data : Wisi.Parse_Data_Type renames Wisi.Parse_Data_Type (User_Data);
T1 : constant SAL.Peek_Type := 1;
T2 : constant SAL.Peek_Type := 2;
T3 : constant SAL.Peek_Type := 3;
T4 : constant SAL.Peek_Type := 4;
begin
case Parse_Data.Post_Parse_Action is
when Navigate =>
Statement_Action (Parse_Data, Tree, Nonterm, (1 => (T1, Motion)));
when Face =>
null;
when Indent =>
Indent_Action_0 (Parse_Data, Tree, Nonterm, (T1 => (False, (Simple, (Label => None))), T2 => (False, (Simple,
(Int, Ada_Indent_Broken))), T3 => (False, (Simple, (Int, Ada_Indent_Broken))), T4 => (False, (Hanging_2, (Int,
Ada_Indent), (Int, Ada_Indent_Broken)))));
end case;
end case_expression_alternative_0;
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)
is
Parse_Data : Wisi.Parse_Data_Type renames Wisi.Parse_Data_Type (User_Data);
T1 : constant SAL.Peek_Type := 1;
T2 : constant SAL.Peek_Type := 2;
T3 : constant SAL.Peek_Type := 3;
T4 : constant SAL.Peek_Type := 4;
begin
case Parse_Data.Post_Parse_Action is
when Navigate =>
null;
when Face =>
null;
when Indent =>
Indent_Action_0 (Parse_Data, Tree, Nonterm, (T1 => (False, (Simple, (Label => None))), T2 => (False, (Simple,
(Int, Ada_Indent_Broken))), T3 => (False, (Simple, (Int, Ada_Indent_Broken))), T4 => (False, (Simple, (Int,
Ada_Indent_Broken)))));
end case;
end quantified_expression_0;
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)
is
Parse_Data : Wisi.Parse_Data_Type renames Wisi.Parse_Data_Type (User_Data);
T1 : constant SAL.Peek_Type := 1;
T2 : constant SAL.Peek_Type := 2;
T3 : constant SAL.Peek_Type := 3;
T4 : constant SAL.Peek_Type := 4;
begin
case Parse_Data.Post_Parse_Action is
when Navigate =>
null;
when Face =>
null;
when Indent =>
Indent_Action_0 (Parse_Data, Tree, Nonterm, (T1 => (False, (Simple, (Label => None))), T2 => (False, (Simple,
(Int, Ada_Indent_Broken))), T3 => (False, (Simple, (Int, Ada_Indent_Broken))), T4 => (False, (Simple, (Int,
Ada_Indent_Broken)))));
end case;
end quantified_expression_1;
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)
is
Parse_Data : Wisi.Parse_Data_Type renames Wisi.Parse_Data_Type (User_Data);
T1 : constant SAL.Peek_Type := 1;
T2 : constant SAL.Peek_Type := 2;
T3 : constant SAL.Peek_Type := 3;
T4 : constant SAL.Peek_Type := 4;
begin
case Parse_Data.Post_Parse_Action is
when Navigate =>
null;
when Face =>
null;
when Indent =>
Indent_Action_0 (Parse_Data, Tree, Nonterm, (T1 => (False, (Simple, (Label => None))), T2 => (False, (Simple,
(Block, Ada_Indent))), T3 => (False, (Simple, (Label => None))), T4 => (False, (Hanging_1, (Int, Ada_Indent),
(Int, Ada_Indent + Ada_Indent_Broken)))));
end case;
end declare_expression_0;
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)
is
Parse_Data : Wisi.Parse_Data_Type renames Wisi.Parse_Data_Type (User_Data);
T1 : constant SAL.Peek_Type := 1;
T3 : constant SAL.Peek_Type := 2;
T4 : constant SAL.Peek_Type := 3;
begin
case Parse_Data.Post_Parse_Action is
when Navigate =>
null;
when Face =>
null;
when Indent =>
Indent_Action_0 (Parse_Data, Tree, Nonterm, (T1 => (False, (Simple, (Label => None))), T3 => (False, (Simple,
(Label => None))), T4 => (False, (Hanging_1, (Int, Ada_Indent), (Int, Ada_Indent + Ada_Indent_Broken)))));
end case;
end declare_expression_1;
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)
is
Parse_Data : Wisi.Parse_Data_Type renames Wisi.Parse_Data_Type (User_Data);
T1 : constant SAL.Peek_Type := 1;
T2 : constant SAL.Peek_Type := 2;
T3 : constant SAL.Peek_Type := 3;
begin
case Parse_Data.Post_Parse_Action is
when Navigate =>
null;
when Face =>
null;
when Indent =>
Indent_Action_0 (Parse_Data, Tree, Nonterm, (T1 => (False, (Hanging_0, (Label => None), (Int,
Ada_Indent_Broken))), T2 => (False, (Simple, (Label => None))), T3 => (False, (Hanging_2, (Int,
Ada_Indent_Broken), (Int, Ada_Indent_Broken)))));
end case;
end reduction_specification_0;
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)
is
Parse_Data : Wisi.Parse_Data_Type renames Wisi.Parse_Data_Type (User_Data);
begin
case Parse_Data.Post_Parse_Action is
when Navigate =>
null;
when Face =>
Face_Apply_Action (Parse_Data, Tree, Nonterm, (1 => (1, 1, 2)));
when Indent =>
Indent_Action_0 (Parse_Data, Tree, Nonterm, ((False, (Simple, (Label => None))), (False, (Simple, (Anchored_1,
1, Ada_Indent_Broken))), (False, (Simple, (Anchored_1, 1, Ada_Indent_Broken)))));
end case;
end qualified_expression_0;
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)
is
Parse_Data : Wisi.Parse_Data_Type renames Wisi.Parse_Data_Type (User_Data);
T2 : constant SAL.Peek_Type := 2;
begin
case Parse_Data.Post_Parse_Action is
when Navigate =>
null;
when Face =>
Face_Apply_Action (Parse_Data, Tree, Nonterm, (1 => (T2, 1, 2)));
when Indent =>
null;
end case;
end subtype_indication_paren_constraint_2;
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)
is
Parse_Data : Wisi.Parse_Data_Type renames Wisi.Parse_Data_Type (User_Data);
T2 : constant SAL.Peek_Type := 1;
begin
case Parse_Data.Post_Parse_Action is
when Navigate =>
null;
when Face =>
Face_Apply_Action (Parse_Data, Tree, Nonterm, (1 => (T2, 1, 2)));
when Indent =>
null;
end case;
end subtype_indication_paren_constraint_3;
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)
is
Parse_Data : Wisi.Parse_Data_Type renames Wisi.Parse_Data_Type (User_Data);
T1 : constant SAL.Peek_Type := 1;
T2 : constant SAL.Peek_Type := 2;
begin
case Parse_Data.Post_Parse_Action is
when Navigate =>
Statement_Action (Parse_Data, Tree, Nonterm, ((T1, Statement_Start), (T2, Statement_End)));
when Face =>
null;
when Indent =>
null;
end case;
end null_statement_0;
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)
is
Parse_Data : Wisi.Parse_Data_Type renames Wisi.Parse_Data_Type (User_Data);
T1 : constant SAL.Peek_Type := 1;
T2 : constant SAL.Peek_Type := 2;
T3 : constant SAL.Peek_Type := 3;
begin
case Parse_Data.Post_Parse_Action is
when Navigate =>
null;
when Face =>
Face_Apply_Action (Parse_Data, Tree, Nonterm, (1 => (T2, 3, 0)));
when Indent =>
Indent_Action_0 (Parse_Data, Tree, Nonterm, (T1 => (False, (Simple, (Int, Ada_Indent_Label))), T2 => (False,
(Simple, (Int, Ada_Indent_Broken))), T3 => (False, (Simple, (Int, Ada_Indent_Broken)))));
end case;
end label_0;
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)
is
Parse_Data : Wisi.Parse_Data_Type renames Wisi.Parse_Data_Type (User_Data);
T1 : constant SAL.Peek_Type := 1;
T2 : constant SAL.Peek_Type := 2;
T3 : constant SAL.Peek_Type := 3;
begin
case Parse_Data.Post_Parse_Action is
when Navigate =>
Statement_Action (Parse_Data, Tree, Nonterm, ((T1, Statement_Start), (T3, Statement_End)));
when Face =>
null;
when Indent =>
Indent_Action_0 (Parse_Data, Tree, Nonterm, (T1 => (False, (Hanging_0, (Label => None), (Int,
Ada_Indent_Broken))), T2 => (False, (Hanging_1, (Anchored_1, T1, Ada_Indent_Broken), (Anchored_1, T1, 2 *
Ada_Indent_Broken))), T3 => (False, (Simple, (Int, Ada_Indent_Broken)))));
end case;
end assignment_statement_0;
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)
is
Parse_Data : Wisi.Parse_Data_Type renames Wisi.Parse_Data_Type (User_Data);
T1 : constant SAL.Peek_Type := 1;
T2 : constant SAL.Peek_Type := 2;
T3 : constant SAL.Peek_Type := 3;
T4 : constant SAL.Peek_Type := 4;
begin
case Parse_Data.Post_Parse_Action is
when Navigate =>
Statement_Action (Parse_Data, Tree, Nonterm, ((T1, Motion), (T3, Motion)));
Motion_Action (Parse_Data, Tree, Nonterm, (Index_ID'(T1, Invalid_Token_ID) & Index_ID'(T3,
Invalid_Token_ID)));
when Face =>
null;
when Indent =>
Indent_Action_0 (Parse_Data, Tree, Nonterm, (T1 => (False, (Simple, (Label => None))), T2 => (True, (Simple,
(Int, Ada_Indent_Broken)), (Simple, (Int, Ada_Indent_Broken))), T3 => (False, (Simple, (Label => None))), T4
=> (True, (Simple, (Block, Ada_Indent)), (Simple, (Int, Ada_Indent)))));
end case;
end elsif_statement_item_0;
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)
is
Parse_Data : Wisi.Parse_Data_Type renames Wisi.Parse_Data_Type (User_Data);
T1 : constant SAL.Peek_Type := 1;
T2 : constant SAL.Peek_Type := 2;
T3 : constant SAL.Peek_Type := 3;
T4 : constant SAL.Peek_Type := 4;
T5 : constant SAL.Peek_Type := 5;
T6 : constant SAL.Peek_Type := 6;
T7 : constant SAL.Peek_Type := 7;
T8 : constant SAL.Peek_Type := 8;
T9 : constant SAL.Peek_Type := 9;
T10 : constant SAL.Peek_Type := 10;
begin
case Parse_Data.Post_Parse_Action is
when Navigate =>
Statement_Action (Parse_Data, Tree, Nonterm, ((T1, Statement_Start), (T3, Motion), (T6, Motion), (T10,
Statement_End)));
Motion_Action (Parse_Data, Tree, Nonterm, (Index_ID'(T1, Invalid_Token_ID) & Index_ID'(T3, Invalid_Token_ID) &
Index_ID'(T5, 42) & Index_ID'(T6, Invalid_Token_ID) & Index_ID'(T10, Invalid_Token_ID)));
when Face =>
null;
when Indent =>
Indent_Action_0 (Parse_Data, Tree, Nonterm, (T1 => (False, (Simple, (Label => None))), T2 => (True,
(Hanging_2, (Int, Ada_Indent_Broken), (Int, Ada_Indent_Broken)), (Simple, (Int, Ada_Indent_Broken))), T3 =>
(False, (Simple, (Label => None))), T4 => (True, (Simple, (Block, Ada_Indent)), (Simple, (Int, Ada_Indent))),
T5 => (False, (Simple, (Label => None))), T6 => (False, (Simple, (Label => None))), T7 => (True, (Simple,
(Block, Ada_Indent)), (Simple, (Int, Ada_Indent))), T8 => (False, (Simple, (Label => None))), T9 => (False,
(Simple, (Int, Ada_Indent_Broken))), T10 => (False, (Simple, (Int, Ada_Indent_Broken)))));
end case;
end if_statement_0;
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)
is
Parse_Data : Wisi.Parse_Data_Type renames Wisi.Parse_Data_Type (User_Data);
T1 : constant SAL.Peek_Type := 1;
T2 : constant SAL.Peek_Type := 2;
T3 : constant SAL.Peek_Type := 3;
T4 : constant SAL.Peek_Type := 4;
T5 : constant SAL.Peek_Type := 5;
T8 : constant SAL.Peek_Type := 6;
T9 : constant SAL.Peek_Type := 7;
T10 : constant SAL.Peek_Type := 8;
begin
case Parse_Data.Post_Parse_Action is
when Navigate =>
Statement_Action (Parse_Data, Tree, Nonterm, ((T1, Statement_Start), (T3, Motion), (T10, Statement_End)));
Motion_Action (Parse_Data, Tree, Nonterm, (Index_ID'(T1, Invalid_Token_ID) & Index_ID'(T3, Invalid_Token_ID) &
Index_ID'(T5, 42) & Index_ID'(T10, Invalid_Token_ID)));
when Face =>
null;
when Indent =>
Indent_Action_0 (Parse_Data, Tree, Nonterm, (T1 => (False, (Simple, (Label => None))), T2 => (True,
(Hanging_2, (Int, Ada_Indent_Broken), (Int, Ada_Indent_Broken)), (Simple, (Int, Ada_Indent_Broken))), T3 =>
(False, (Simple, (Label => None))), T4 => (True, (Simple, (Block, Ada_Indent)), (Simple, (Int, Ada_Indent))),
T5 => (False, (Simple, (Label => None))), T8 => (False, (Simple, (Label => None))), T9 => (False, (Simple,
(Int, Ada_Indent_Broken))), T10 => (False, (Simple, (Int, Ada_Indent_Broken)))));
end case;
end if_statement_1;
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)
is
Parse_Data : Wisi.Parse_Data_Type renames Wisi.Parse_Data_Type (User_Data);
T1 : constant SAL.Peek_Type := 1;
T2 : constant SAL.Peek_Type := 2;
T3 : constant SAL.Peek_Type := 3;
T4 : constant SAL.Peek_Type := 4;
T6 : constant SAL.Peek_Type := 5;
T7 : constant SAL.Peek_Type := 6;
T8 : constant SAL.Peek_Type := 7;
T9 : constant SAL.Peek_Type := 8;
T10 : constant SAL.Peek_Type := 9;
begin
case Parse_Data.Post_Parse_Action is
when Navigate =>
Statement_Action (Parse_Data, Tree, Nonterm, ((T1, Statement_Start), (T3, Motion), (T6, Motion), (T10,
Statement_End)));
Motion_Action (Parse_Data, Tree, Nonterm, (Index_ID'(T1, Invalid_Token_ID) & Index_ID'(T3, Invalid_Token_ID) &
Index_ID'(T6, Invalid_Token_ID) & Index_ID'(T10, Invalid_Token_ID)));
when Face =>
null;
when Indent =>
Indent_Action_0 (Parse_Data, Tree, Nonterm, (T1 => (False, (Simple, (Label => None))), T2 => (True,
(Hanging_2, (Int, Ada_Indent_Broken), (Int, Ada_Indent_Broken)), (Simple, (Int, Ada_Indent_Broken))), T3 =>
(False, (Simple, (Label => None))), T4 => (True, (Simple, (Block, Ada_Indent)), (Simple, (Int, Ada_Indent))),
T6 => (False, (Simple, (Label => None))), T7 => (True, (Simple, (Block, Ada_Indent)), (Simple, (Int,
Ada_Indent))), T8 => (False, (Simple, (Label => None))), T9 => (False, (Simple, (Int, Ada_Indent_Broken))),
T10 => (False, (Simple, (Int, Ada_Indent_Broken)))));
end case;
end if_statement_2;
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)
is
Parse_Data : Wisi.Parse_Data_Type renames Wisi.Parse_Data_Type (User_Data);
T1 : constant SAL.Peek_Type := 1;
T2 : constant SAL.Peek_Type := 2;
T3 : constant SAL.Peek_Type := 3;
T4 : constant SAL.Peek_Type := 4;
T8 : constant SAL.Peek_Type := 5;
T9 : constant SAL.Peek_Type := 6;
T10 : constant SAL.Peek_Type := 7;
begin
case Parse_Data.Post_Parse_Action is
when Navigate =>
Statement_Action (Parse_Data, Tree, Nonterm, ((T1, Statement_Start), (T3, Motion), (T10, Statement_End)));
Motion_Action (Parse_Data, Tree, Nonterm, (Index_ID'(T1, Invalid_Token_ID) & Index_ID'(T3, Invalid_Token_ID) &
Index_ID'(T10, Invalid_Token_ID)));
when Face =>
null;
when Indent =>
Indent_Action_0 (Parse_Data, Tree, Nonterm, (T1 => (False, (Simple, (Label => None))), T2 => (True,
(Hanging_2, (Int, Ada_Indent_Broken), (Int, Ada_Indent_Broken)), (Simple, (Int, Ada_Indent_Broken))), T3 =>
(False, (Simple, (Label => None))), T4 => (True, (Simple, (Block, Ada_Indent)), (Simple, (Int, Ada_Indent))),
T8 => (False, (Simple, (Label => None))), T9 => (False, (Simple, (Int, Ada_Indent_Broken))), T10 => (False,
(Simple, (Int, Ada_Indent_Broken)))));
end case;
end if_statement_3;
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)
is
Parse_Data : Wisi.Parse_Data_Type renames Wisi.Parse_Data_Type (User_Data);
T1 : constant SAL.Peek_Type := 1;
T2 : constant SAL.Peek_Type := 2;
T3 : constant SAL.Peek_Type := 3;
T4 : constant SAL.Peek_Type := 4;
T5 : constant SAL.Peek_Type := 5;
T6 : constant SAL.Peek_Type := 6;
T7 : constant SAL.Peek_Type := 7;
begin
case Parse_Data.Post_Parse_Action is
when Navigate =>
Statement_Action (Parse_Data, Tree, Nonterm, ((T1, Statement_Start), (T7, Statement_End)));
Motion_Action (Parse_Data, Tree, Nonterm, (Index_ID'(T1, Invalid_Token_ID) & Index_ID'(T4, 63) & Index_ID'(T7,
Invalid_Token_ID)));
when Face =>
null;
when Indent =>
Indent_Action_0 (Parse_Data, Tree, Nonterm, (T1 => (False, (Simple, (Label => None))), T2 => (False,
(Hanging_2, (Int, Ada_Indent_Broken), (Int, Ada_Indent_Broken))), T3 => (False, (Simple, (Label => None))), T4
=> (True, (Simple, (Int, Ada_Indent_When)), (Simple, (Int, Ada_Indent_When))), T5 => (False, (Simple, (Label
=> None))), T6 => (False, (Simple, (Int, Ada_Indent_Broken))), T7 => (False, (Simple, (Int,
Ada_Indent_Broken)))));
end case;
end case_statement_0;
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)
is
Parse_Data : Wisi.Parse_Data_Type renames Wisi.Parse_Data_Type (User_Data);
T1 : constant SAL.Peek_Type := 1;
T2 : constant SAL.Peek_Type := 2;
T3 : constant SAL.Peek_Type := 3;
T4 : constant SAL.Peek_Type := 4;
begin
case Parse_Data.Post_Parse_Action is
when Navigate =>
Statement_Action (Parse_Data, Tree, Nonterm, (1 => (T1, Motion)));
when Face =>
null;
when Indent =>
Indent_Action_0 (Parse_Data, Tree, Nonterm, (T1 => (False, (Simple, (Label => None))), T2 => (False, (Simple,
(Int, Ada_Indent_Broken))), T3 => (False, (Simple, (Int, Ada_Indent_Broken))), T4 => (True, (Simple, (Block,
Ada_Indent)), (Simple, (Int, Ada_Indent)))));
end case;
end case_statement_alternative_0;
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)
is
Parse_Data : Wisi.Parse_Data_Type renames Wisi.Parse_Data_Type (User_Data);
T1 : constant SAL.Peek_Type := 1;
T2 : constant SAL.Peek_Type := 2;
T3 : constant SAL.Peek_Type := 3;
T4 : constant SAL.Peek_Type := 4;
T5 : constant SAL.Peek_Type := 5;
T6 : constant SAL.Peek_Type := 6;
T7 : constant SAL.Peek_Type := 7;
T8 : constant SAL.Peek_Type := 8;
begin
case Parse_Data.Post_Parse_Action is
when Navigate =>
Statement_Action (Parse_Data, Tree, Nonterm, ((T1, Statement_Start), (T2, Statement_Override), (T3, Motion),
(T8, Statement_End)));
Motion_Action (Parse_Data, Tree, Nonterm, (Index_ID'(T2, Invalid_Token_ID) & Index_ID'(T3, Invalid_Token_ID) &
Index_ID'(T8, Invalid_Token_ID)));
when Face =>
null;
when Indent =>
Indent_Action_0 (Parse_Data, Tree, Nonterm, (T1 => (False, (Simple, (Int, Ada_Indent_Label))), T2 => (False,
(Simple, (Label => None))), T3 => (False, (Simple, (Label => None))), T4 => (True, (Simple, (Block,
Ada_Indent)), (Simple, (Int, Ada_Indent))), T5 => (False, (Simple, (Label => None))), T6 => (False, (Simple,
(Int, Ada_Indent_Broken))), T7 => (False, (Simple, (Int, Ada_Indent_Broken))), T8 => (False, (Simple, (Int,
Ada_Indent_Broken)))));
end case;
end loop_statement_0;
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
is
pragma Unreferenced (Nonterm, Recover_Active);
T1 : constant SAL.Peek_Type := 1;
T7 : constant SAL.Peek_Type := 7;
begin
return Match_Names (Tree, Tokens, T1, T7, End_Names_Optional);
end loop_statement_0_check;
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)
is
Parse_Data : Wisi.Parse_Data_Type renames Wisi.Parse_Data_Type (User_Data);
T1 : constant SAL.Peek_Type := 1;
T3 : constant SAL.Peek_Type := 2;
T4 : constant SAL.Peek_Type := 3;
T5 : constant SAL.Peek_Type := 4;
T6 : constant SAL.Peek_Type := 5;
T7 : constant SAL.Peek_Type := 6;
T8 : constant SAL.Peek_Type := 7;
begin
case Parse_Data.Post_Parse_Action is
when Navigate =>
Statement_Action (Parse_Data, Tree, Nonterm, ((T1, Statement_Start), (T3, Motion), (T8, Statement_End)));
Motion_Action (Parse_Data, Tree, Nonterm, (Index_ID'(T3, Invalid_Token_ID) & Index_ID'(T8,
Invalid_Token_ID)));
when Face =>
null;
when Indent =>
Indent_Action_0 (Parse_Data, Tree, Nonterm, (T1 => (False, (Simple, (Int, Ada_Indent_Label))), T3 => (False,
(Simple, (Label => None))), T4 => (True, (Simple, (Block, Ada_Indent)), (Simple, (Int, Ada_Indent))), T5 =>
(False, (Simple, (Label => None))), T6 => (False, (Simple, (Int, Ada_Indent_Broken))), T7 => (False, (Simple,
(Int, Ada_Indent_Broken))), T8 => (False, (Simple, (Int, Ada_Indent_Broken)))));
end case;
end loop_statement_1;
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
is
pragma Unreferenced (Nonterm, Recover_Active);
T1 : constant SAL.Peek_Type := 1;
T7 : constant SAL.Peek_Type := 6;
begin
return Match_Names (Tree, Tokens, T1, T7, End_Names_Optional);
end loop_statement_1_check;
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)
is
Parse_Data : Wisi.Parse_Data_Type renames Wisi.Parse_Data_Type (User_Data);
T1 : constant SAL.Peek_Type := 1;
T2 : constant SAL.Peek_Type := 2;
begin
case Parse_Data.Post_Parse_Action is
when Navigate =>
null;
when Face =>
null;
when Indent =>
Indent_Action_0 (Parse_Data, Tree, Nonterm, (T1 => (False, (Simple, (Label => None))), T2 => (True, (Simple,
(Int, Ada_Indent_Broken)), (Simple, (Int, Ada_Indent_Broken)))));
end case;
end iteration_scheme_0;
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)
is
Parse_Data : Wisi.Parse_Data_Type renames Wisi.Parse_Data_Type (User_Data);
T1 : constant SAL.Peek_Type := 1;
T2 : constant SAL.Peek_Type := 2;
begin
case Parse_Data.Post_Parse_Action is
when Navigate =>
null;
when Face =>
null;
when Indent =>
Indent_Action_0 (Parse_Data, Tree, Nonterm, (T1 => (False, (Simple, (Label => None))), T2 => (True, (Simple,
(Int, Ada_Indent_Broken)), (Simple, (Int, Ada_Indent_Broken)))));
end case;
end iteration_scheme_1;
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)
is
Parse_Data : Wisi.Parse_Data_Type renames Wisi.Parse_Data_Type (User_Data);
T1 : constant SAL.Peek_Type := 1;
T2 : constant SAL.Peek_Type := 2;
begin
case Parse_Data.Post_Parse_Action is
when Navigate =>
null;
when Face =>
null;
when Indent =>
Indent_Action_0 (Parse_Data, Tree, Nonterm, (T1 => (False, (Simple, (Label => None))), T2 => (True, (Simple,
(Int, Ada_Indent_Broken)), (Simple, (Int, Ada_Indent_Broken)))));
end case;
end iteration_scheme_2;
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)
is
Parse_Data : Wisi.Parse_Data_Type renames Wisi.Parse_Data_Type (User_Data);
T1 : constant SAL.Peek_Type := 1;
T2 : constant SAL.Peek_Type := 2;
T3 : constant SAL.Peek_Type := 3;
begin
case Parse_Data.Post_Parse_Action is
when Navigate =>
null;
when Face =>
null;
when Indent =>
Indent_Action_0 (Parse_Data, Tree, Nonterm, (T1 => (False, (Simple, (Label => None))), T2 => (False, (Simple,
(Label => None))), T3 => (True, (Simple, (Int, Ada_Indent_Broken)), (Simple, (Int, Ada_Indent_Broken)))));
end case;
end iteration_scheme_3;
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)
is
Parse_Data : Wisi.Parse_Data_Type renames Wisi.Parse_Data_Type (User_Data);
T2 : constant SAL.Peek_Type := 1;
T3 : constant SAL.Peek_Type := 2;
begin
case Parse_Data.Post_Parse_Action is
when Navigate =>
null;
when Face =>
null;
when Indent =>
Indent_Action_0 (Parse_Data, Tree, Nonterm, (T2 => (False, (Simple, (Label => None))), T3 => (True, (Simple,
(Int, Ada_Indent_Broken)), (Simple, (Int, Ada_Indent_Broken)))));
end case;
end iteration_scheme_4;
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)
is
Parse_Data : Wisi.Parse_Data_Type renames Wisi.Parse_Data_Type (User_Data);
T1 : constant SAL.Peek_Type := 1;
T2 : constant SAL.Peek_Type := 2;
T3 : constant SAL.Peek_Type := 3;
T4 : constant SAL.Peek_Type := 4;
T5 : constant SAL.Peek_Type := 5;
T6 : constant SAL.Peek_Type := 6;
begin
case Parse_Data.Post_Parse_Action is
when Navigate =>
null;
when Face =>
null;
when Indent =>
Indent_Action_0 (Parse_Data, Tree, Nonterm, (T1 => (False, (Simple, (Label => None))), T2 => (False, (Simple,
(Label => None))), T3 => (False, (Simple, (Anchored_0, T1, 1))), T4 => (False, (Simple, (Anchored_0, T1, 0))),
T5 => (False, (Simple, (Label => None))), T6 => (True, (Simple, (Int, Ada_Indent_Broken)), (Simple, (Int,
Ada_Indent_Broken)))));
end case;
end iteration_scheme_5;
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)
is
Parse_Data : Wisi.Parse_Data_Type renames Wisi.Parse_Data_Type (User_Data);
T1 : constant SAL.Peek_Type := 1;
T5 : constant SAL.Peek_Type := 2;
T6 : constant SAL.Peek_Type := 3;
begin
case Parse_Data.Post_Parse_Action is
when Navigate =>
null;
when Face =>
null;
when Indent =>
Indent_Action_0 (Parse_Data, Tree, Nonterm, (T1 => (False, (Simple, (Label => None))), T5 => (False, (Simple,
(Label => None))), T6 => (True, (Simple, (Int, Ada_Indent_Broken)), (Simple, (Int, Ada_Indent_Broken)))));
end case;
end iteration_scheme_6;
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)
is
Parse_Data : Wisi.Parse_Data_Type renames Wisi.Parse_Data_Type (User_Data);
T1 : constant SAL.Peek_Type := 1;
T2 : constant SAL.Peek_Type := 2;
T3 : constant SAL.Peek_Type := 3;
T4 : constant SAL.Peek_Type := 4;
T5 : constant SAL.Peek_Type := 5;
T6 : constant SAL.Peek_Type := 6;
begin
case Parse_Data.Post_Parse_Action is
when Navigate =>
null;
when Face =>
null;
when Indent =>
Indent_Action_0 (Parse_Data, Tree, Nonterm, (T1 => (False, (Simple, (Label => None))), T2 => (False, (Simple,
(Label => None))), T3 => (False, (Simple, (Anchored_0, T1, 1))), T4 => (False, (Simple, (Anchored_0, T1, 0))),
T5 => (False, (Simple, (Label => None))), T6 => (True, (Simple, (Int, Ada_Indent_Broken)), (Simple, (Int,
Ada_Indent_Broken)))));
end case;
end iteration_scheme_7;
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)
is
Parse_Data : Wisi.Parse_Data_Type renames Wisi.Parse_Data_Type (User_Data);
T1 : constant SAL.Peek_Type := 1;
T5 : constant SAL.Peek_Type := 2;
T6 : constant SAL.Peek_Type := 3;
begin
case Parse_Data.Post_Parse_Action is
when Navigate =>
null;
when Face =>
null;
when Indent =>
Indent_Action_0 (Parse_Data, Tree, Nonterm, (T1 => (False, (Simple, (Label => None))), T5 => (False, (Simple,
(Label => None))), T6 => (True, (Simple, (Int, Ada_Indent_Broken)), (Simple, (Int, Ada_Indent_Broken)))));
end case;
end iteration_scheme_8;
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)
is
Parse_Data : Wisi.Parse_Data_Type renames Wisi.Parse_Data_Type (User_Data);
begin
case Parse_Data.Post_Parse_Action is
when Navigate =>
null;
when Face =>
null;
when Indent =>
Indent_Action_0 (Parse_Data, Tree, Nonterm, (1 => (False, (Hanging_0, (Label => None), (Int,
Ada_Indent_Broken)))));
end case;
end chunk_specification_0;
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)
is
Parse_Data : Wisi.Parse_Data_Type renames Wisi.Parse_Data_Type (User_Data);
T1 : constant SAL.Peek_Type := 1;
T2 : constant SAL.Peek_Type := 2;
T3 : constant SAL.Peek_Type := 3;
begin
case Parse_Data.Post_Parse_Action is
when Navigate =>
null;
when Face =>
null;
when Indent =>
Indent_Action_0 (Parse_Data, Tree, Nonterm, (T1 => (False, (Simple, (Label => None))), T2 => (False, (Simple,
(Int, Ada_Indent_Broken))), T3 => (False, (Simple, (Int, Ada_Indent_Broken)))));
end case;
end chunk_specification_1;
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
is
pragma Unreferenced (Recover_Active);
T1 : constant SAL.Peek_Type := 1;
begin
return Propagate_Name (Tree, Nonterm, Tokens, T1);
end label_opt_0_check;
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)
is
Parse_Data : Wisi.Parse_Data_Type renames Wisi.Parse_Data_Type (User_Data);
T1 : constant SAL.Peek_Type := 1;
T2 : constant SAL.Peek_Type := 2;
T3 : constant SAL.Peek_Type := 3;
T4 : constant SAL.Peek_Type := 4;
T5 : constant SAL.Peek_Type := 5;
T6 : constant SAL.Peek_Type := 6;
T7 : constant SAL.Peek_Type := 7;
T8 : constant SAL.Peek_Type := 8;
begin
case Parse_Data.Post_Parse_Action is
when Navigate =>
Statement_Action (Parse_Data, Tree, Nonterm, ((T1, Statement_Start), (T2, Statement_Override), (T4,
Statement_Override), (T8, Statement_End)));
Motion_Action (Parse_Data, Tree, Nonterm, (Index_ID'(T1, Invalid_Token_ID) & Index_ID'(T2, Invalid_Token_ID) &
Index_ID'(T4, Invalid_Token_ID) & Index_ID'(T5, 63) & Index_ID'(T8, Invalid_Token_ID)));
when Face =>
null;
when Indent =>
Indent_Action_0 (Parse_Data, Tree, Nonterm, (T1 => (False, (Simple, (Int, Ada_Indent_Label))), T2 => (False,
(Simple, (Label => None))), T3 => (True, (Simple, (Block, Ada_Indent)), (Simple, (Int, Ada_Indent))), T4 =>
(False, (Simple, (Label => None))), T5 => (True, (Simple, (Block, Ada_Indent)), (Simple, (Int, Ada_Indent))),
T6 => (False, (Simple, (Label => None))), T7 => (False, (Simple, (Int, Ada_Indent_Broken))), T8 => (False,
(Simple, (Int, Ada_Indent_Broken)))));
end case;
end block_statement_0;
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
is
pragma Unreferenced (Nonterm, Recover_Active);
T1 : constant SAL.Peek_Type := 1;
T7 : constant SAL.Peek_Type := 7;
begin
return Match_Names (Tree, Tokens, T1, T7, End_Names_Optional);
end block_statement_0_check;
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)
is
Parse_Data : Wisi.Parse_Data_Type renames Wisi.Parse_Data_Type (User_Data);
T1 : constant SAL.Peek_Type := 1;
T4 : constant SAL.Peek_Type := 2;
T5 : constant SAL.Peek_Type := 3;
T6 : constant SAL.Peek_Type := 4;
T7 : constant SAL.Peek_Type := 5;
T8 : constant SAL.Peek_Type := 6;
begin
case Parse_Data.Post_Parse_Action is
when Navigate =>
Statement_Action (Parse_Data, Tree, Nonterm, ((T1, Statement_Start), (T4, Statement_Override), (T8,
Statement_End)));
Motion_Action (Parse_Data, Tree, Nonterm, (Index_ID'(T1, Invalid_Token_ID) & Index_ID'(T4, Invalid_Token_ID) &
Index_ID'(T5, 63) & Index_ID'(T8, Invalid_Token_ID)));
when Face =>
null;
when Indent =>
Indent_Action_0 (Parse_Data, Tree, Nonterm, (T1 => (False, (Simple, (Int, Ada_Indent_Label))), T4 => (False,
(Simple, (Label => None))), T5 => (True, (Simple, (Block, Ada_Indent)), (Simple, (Int, Ada_Indent))), T6 =>
(False, (Simple, (Label => None))), T7 => (False, (Simple, (Int, Ada_Indent_Broken))), T8 => (False, (Simple,
(Int, Ada_Indent_Broken)))));
end case;
end block_statement_1;
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
is
pragma Unreferenced (Nonterm, Recover_Active);
T1 : constant SAL.Peek_Type := 1;
T7 : constant SAL.Peek_Type := 5;
begin
return Match_Names (Tree, Tokens, T1, T7, End_Names_Optional);
end block_statement_1_check;
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)
is
Parse_Data : Wisi.Parse_Data_Type renames Wisi.Parse_Data_Type (User_Data);
T1 : constant SAL.Peek_Type := 1;
T2 : constant SAL.Peek_Type := 2;
T3 : constant SAL.Peek_Type := 3;
begin
case Parse_Data.Post_Parse_Action is
when Navigate =>
null;
when Face =>
null;
when Indent =>
Indent_Action_0 (Parse_Data, Tree, Nonterm, (T1 => (False, (Simple, (Label => None))), T2 => (False, (Simple,
(Int, -Ada_Indent))), T3 => (False, (Simple, (Label => None)))));
end case;
end statement_AND_list_1;
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)
is
Parse_Data : Wisi.Parse_Data_Type renames Wisi.Parse_Data_Type (User_Data);
T1 : constant SAL.Peek_Type := 1;
T2 : constant SAL.Peek_Type := 2;
T3 : constant SAL.Peek_Type := 3;
T4 : constant SAL.Peek_Type := 4;
T5 : constant SAL.Peek_Type := 5;
T6 : constant SAL.Peek_Type := 6;
T7 : constant SAL.Peek_Type := 7;
T8 : constant SAL.Peek_Type := 8;
begin
case Parse_Data.Post_Parse_Action is
when Navigate =>
null;
when Face =>
null;
when Indent =>
Indent_Action_0 (Parse_Data, Tree, Nonterm, (T1 => (False, (Simple, (Label => None))), T2 => (False, (Simple,
(Label => None))), T3 => (True, (Simple, (Block, Ada_Indent)), (Simple, (Int, Ada_Indent))), T4 => (False,
(Simple, (Label => None))), T5 => (True, (Simple, (Block, Ada_Indent)), (Simple, (Int, Ada_Indent))), T6 =>
(False, (Simple, (Label => None))), T7 => (False, (Simple, (Label => None))), T8 => (False, (Simple, (Label =>
None)))));
end case;
end parallel_block_statement_0;
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)
is
Parse_Data : Wisi.Parse_Data_Type renames Wisi.Parse_Data_Type (User_Data);
T1 : constant SAL.Peek_Type := 1;
T2 : constant SAL.Peek_Type := 2;
T3 : constant SAL.Peek_Type := 3;
T4 : constant SAL.Peek_Type := 4;
T5 : constant SAL.Peek_Type := 5;
begin
case Parse_Data.Post_Parse_Action is
when Navigate =>
Statement_Action (Parse_Data, Tree, Nonterm, ((T1, Statement_Start), (T5, Statement_End)));
when Face =>
null;
when Indent =>
Indent_Action_0 (Parse_Data, Tree, Nonterm, (T1 => (False, (Simple, (Label => None))), T2 => (False, (Simple,
(Label => None))), T3 => (False, (Simple, (Label => None))), T4 => (False, (Simple, (Int,
Ada_Indent_Broken))), T5 => (False, (Simple, (Int, Ada_Indent_Broken)))));
end case;
end exit_statement_0;
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)
is
Parse_Data : Wisi.Parse_Data_Type renames Wisi.Parse_Data_Type (User_Data);
T1 : constant SAL.Peek_Type := 1;
T2 : constant SAL.Peek_Type := 2;
T5 : constant SAL.Peek_Type := 3;
begin
case Parse_Data.Post_Parse_Action is
when Navigate =>
Statement_Action (Parse_Data, Tree, Nonterm, ((T1, Statement_Start), (T5, Statement_End)));
when Face =>
null;
when Indent =>
Indent_Action_0 (Parse_Data, Tree, Nonterm, (T1 => (False, (Simple, (Label => None))), T2 => (False, (Simple,
(Label => None))), T5 => (False, (Simple, (Int, Ada_Indent_Broken)))));
end case;
end exit_statement_1;
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)
is
Parse_Data : Wisi.Parse_Data_Type renames Wisi.Parse_Data_Type (User_Data);
T1 : constant SAL.Peek_Type := 1;
T3 : constant SAL.Peek_Type := 2;
T4 : constant SAL.Peek_Type := 3;
T5 : constant SAL.Peek_Type := 4;
begin
case Parse_Data.Post_Parse_Action is
when Navigate =>
Statement_Action (Parse_Data, Tree, Nonterm, ((T1, Statement_Start), (T5, Statement_End)));
when Face =>
null;
when Indent =>
Indent_Action_0 (Parse_Data, Tree, Nonterm, (T1 => (False, (Simple, (Label => None))), T3 => (False, (Simple,
(Label => None))), T4 => (False, (Simple, (Int, Ada_Indent_Broken))), T5 => (False, (Simple, (Int,
Ada_Indent_Broken)))));
end case;
end exit_statement_2;
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)
is
Parse_Data : Wisi.Parse_Data_Type renames Wisi.Parse_Data_Type (User_Data);
T1 : constant SAL.Peek_Type := 1;
T5 : constant SAL.Peek_Type := 2;
begin
case Parse_Data.Post_Parse_Action is
when Navigate =>
Statement_Action (Parse_Data, Tree, Nonterm, ((T1, Statement_Start), (T5, Statement_End)));
when Face =>
null;
when Indent =>
Indent_Action_0 (Parse_Data, Tree, Nonterm, (T1 => (False, (Simple, (Label => None))), T5 => (False, (Simple,
(Int, Ada_Indent_Broken)))));
end case;
end exit_statement_3;
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)
is
Parse_Data : Wisi.Parse_Data_Type renames Wisi.Parse_Data_Type (User_Data);
T1 : constant SAL.Peek_Type := 1;
T2 : constant SAL.Peek_Type := 2;
T3 : constant SAL.Peek_Type := 3;
begin
case Parse_Data.Post_Parse_Action is
when Navigate =>
Statement_Action (Parse_Data, Tree, Nonterm, ((T1, Statement_Start), (T3, Statement_End)));
when Face =>
Face_Apply_Action (Parse_Data, Tree, Nonterm, (1 => (T2, 3, 0)));
when Indent =>
null;
end case;
end goto_statement_0;
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)
is
Parse_Data : Wisi.Parse_Data_Type renames Wisi.Parse_Data_Type (User_Data);
T1 : constant SAL.Peek_Type := 1;
T2 : constant SAL.Peek_Type := 2;
T4 : constant SAL.Peek_Type := 4;
begin
case Parse_Data.Post_Parse_Action is
when Navigate =>
Statement_Action (Parse_Data, Tree, Nonterm, ((T1, Statement_Start), (T2, Statement_Override), (T4,
Statement_End)));
when Face =>
null;
when Indent =>
null;
end case;
end subprogram_declaration_0;
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)
is
Parse_Data : Wisi.Parse_Data_Type renames Wisi.Parse_Data_Type (User_Data);
T1 : constant SAL.Peek_Type := 1;
T2 : constant SAL.Peek_Type := 2;
T4 : constant SAL.Peek_Type := 3;
begin
case Parse_Data.Post_Parse_Action is
when Navigate =>
Statement_Action (Parse_Data, Tree, Nonterm, ((T1, Statement_Start), (T2, Statement_Override), (T4,
Statement_End)));
when Face =>
null;
when Indent =>
null;
end case;
end subprogram_declaration_1;
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)
is
Parse_Data : Wisi.Parse_Data_Type renames Wisi.Parse_Data_Type (User_Data);
T2 : constant SAL.Peek_Type := 1;
T4 : constant SAL.Peek_Type := 3;
begin
case Parse_Data.Post_Parse_Action is
when Navigate =>
Statement_Action (Parse_Data, Tree, Nonterm, ((T2, Statement_Override), (T4, Statement_End)));
when Face =>
null;
when Indent =>
null;
end case;
end subprogram_declaration_2;
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)
is
Parse_Data : Wisi.Parse_Data_Type renames Wisi.Parse_Data_Type (User_Data);
T2 : constant SAL.Peek_Type := 1;
T4 : constant SAL.Peek_Type := 2;
begin
case Parse_Data.Post_Parse_Action is
when Navigate =>
Statement_Action (Parse_Data, Tree, Nonterm, ((T2, Statement_Override), (T4, Statement_End)));
when Face =>
null;
when Indent =>
null;
end case;
end subprogram_declaration_3;
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
is
pragma Unreferenced (Recover_Active);
begin
return Propagate_Name (Tree, Nonterm, Tokens, 1);
end subprogram_specification_0_check;
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
is
pragma Unreferenced (Recover_Active);
begin
return Propagate_Name (Tree, Nonterm, Tokens, 1);
end subprogram_specification_1_check;
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)
is
Parse_Data : Wisi.Parse_Data_Type renames Wisi.Parse_Data_Type (User_Data);
T1 : constant SAL.Peek_Type := 1;
T2 : constant SAL.Peek_Type := 2;
T3 : constant SAL.Peek_Type := 3;
begin
case Parse_Data.Post_Parse_Action is
when Navigate =>
Statement_Action (Parse_Data, Tree, Nonterm, (1 => (T1, Statement_Start)));
Name_Action (Parse_Data, Tree, Nonterm, T2);
when Face =>
Face_Apply_Action (Parse_Data, Tree, Nonterm, (1 => (T2, 1, 1)));
when Indent =>
Indent_Action_0 (Parse_Data, Tree, Nonterm, (T1 => (False, (Simple, (Label => None))), T2 => (True,
(Hanging_2, (Int, Ada_Indent_Broken), (Int, Ada_Indent_Broken)), (Simple, (Label => None))), T3 => (True,
(Simple, (Int, Ada_Indent_Broken)), (Simple, (Label => None)))));
end case;
end procedure_specification_0;
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
is
pragma Unreferenced (Recover_Active);
T2 : constant SAL.Peek_Type := 2;
begin
return Propagate_Name (Tree, Nonterm, Tokens, T2);
end procedure_specification_0_check;
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)
is
Parse_Data : Wisi.Parse_Data_Type renames Wisi.Parse_Data_Type (User_Data);
T1 : constant SAL.Peek_Type := 1;
T2 : constant SAL.Peek_Type := 2;
T3 : constant SAL.Peek_Type := 3;
begin
case Parse_Data.Post_Parse_Action is
when Navigate =>
Statement_Action (Parse_Data, Tree, Nonterm, (1 => (T1, Statement_Start)));
Name_Action (Parse_Data, Tree, Nonterm, T2);
when Face =>
Face_Apply_Action (Parse_Data, Tree, Nonterm, (1 => (T2, 1, 1)));
when Indent =>
Indent_Action_0 (Parse_Data, Tree, Nonterm, (T1 => (False, (Simple, (Label => None))), T2 => (False,
(Hanging_2, (Int, Ada_Indent_Broken), (Int, Ada_Indent_Broken))), T3 => (False, (Simple, (Int,
Ada_Indent_Broken)))));
end case;
end function_specification_0;
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
is
pragma Unreferenced (Recover_Active);
T2 : constant SAL.Peek_Type := 2;
begin
return Propagate_Name (Tree, Nonterm, Tokens, T2);
end function_specification_0_check;
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)
is
Parse_Data : Wisi.Parse_Data_Type renames Wisi.Parse_Data_Type (User_Data);
T1 : constant SAL.Peek_Type := 1;
T2 : constant SAL.Peek_Type := 2;
T3 : constant SAL.Peek_Type := 3;
begin
case Parse_Data.Post_Parse_Action is
when Navigate =>
null;
when Face =>
Face_Apply_Action (Parse_Data, Tree, Nonterm, (1 => (T3, 1, 2)));
when Indent =>
Indent_Action_0 (Parse_Data, Tree, Nonterm, (T1 => (False, (Simple, (Label => None))), T2 => (False, (Simple,
(Anchored_1, T1, Ada_Indent_Broken))), T3 => (False, (Hanging_0, (Anchored_1, T1, Ada_Indent_Broken),
(Anchored_1, T1, Ada_Indent_Broken)))));
end case;
end result_profile_0;
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)
is
Parse_Data : Wisi.Parse_Data_Type renames Wisi.Parse_Data_Type (User_Data);
T1 : constant SAL.Peek_Type := 1;
T3 : constant SAL.Peek_Type := 2;
begin
case Parse_Data.Post_Parse_Action is
when Navigate =>
null;
when Face =>
Face_Apply_Action (Parse_Data, Tree, Nonterm, (1 => (T3, 1, 2)));
when Indent =>
Indent_Action_0 (Parse_Data, Tree, Nonterm, (T1 => (False, (Simple, (Label => None))), T3 => (False,
(Hanging_0, (Anchored_1, T1, Ada_Indent_Broken), (Anchored_1, T1, Ada_Indent_Broken)))));
end case;
end result_profile_1;
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)
is
Parse_Data : Wisi.Parse_Data_Type renames Wisi.Parse_Data_Type (User_Data);
T1 : constant SAL.Peek_Type := 1;
T2 : constant SAL.Peek_Type := 2;
begin
case Parse_Data.Post_Parse_Action is
when Navigate =>
null;
when Face =>
null;
when Indent =>
Indent_Action_0 (Parse_Data, Tree, Nonterm, (T1 => (False, (Simple, (Label => None))), T2 => (False, (Simple,
(Anchored_1, T1, Ada_Indent_Broken)))));
end case;
end result_profile_2;
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)
is
Parse_Data : Wisi.Parse_Data_Type renames Wisi.Parse_Data_Type (User_Data);
begin
case Parse_Data.Post_Parse_Action is
when Navigate =>
null;
when Face =>
null;
when Indent =>
Indent_Action_0 (Parse_Data, Tree, Nonterm, ((False, (Simple, (Label => None))), (False, (Simple, (Language,
Ada_Indent_Return_0'Access, 1 & 0)))));
end case;
end parameter_and_result_profile_0;
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)
is
Parse_Data : Wisi.Parse_Data_Type renames Wisi.Parse_Data_Type (User_Data);
T1 : constant SAL.Peek_Type := 1;
T2 : constant SAL.Peek_Type := 2;
T3 : constant SAL.Peek_Type := 3;
begin
case Parse_Data.Post_Parse_Action is
when Navigate =>
Statement_Action (Parse_Data, Tree, Nonterm, (1 => (T1, Misc)));
when Face =>
null;
when Indent =>
Indent_Action_0 (Parse_Data, Tree, Nonterm, (T1 => (False, (Simple, (Label => None))), T2 => (False, (Simple,
(Anchored_0, T1, 1))), T3 => (False, (Simple, (Anchored_0, T1, 0)))));
end case;
end formal_part_0;
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)
is
Parse_Data : Wisi.Parse_Data_Type renames Wisi.Parse_Data_Type (User_Data);
T1 : constant SAL.Peek_Type := 1;
T2 : constant SAL.Peek_Type := 2;
T3 : constant SAL.Peek_Type := 3;
T4 : constant SAL.Peek_Type := 4;
T5 : constant SAL.Peek_Type := 5;
T6 : constant SAL.Peek_Type := 6;
T7 : constant SAL.Peek_Type := 7;
begin
case Parse_Data.Post_Parse_Action is
when Navigate =>
null;
when Face =>
Face_Apply_Action (Parse_Data, Tree, Nonterm, (1 => (T6, 1, 2)));
when Indent =>
Indent_Action_0 (Parse_Data, Tree, Nonterm, (T1 => (False, (Simple, (Label => None))), T2 => (False, (Simple,
(Int, Ada_Indent_Broken))), T3 => (False, (Simple, (Int, Ada_Indent_Broken))), T4 => (False, (Simple, (Int,
Ada_Indent_Broken))), T5 => (False, (Simple, (Int, Ada_Indent_Broken))), T6 => (False, (Hanging_0,
(Anchored_1, T2, Ada_Indent_Broken), (Anchored_1, T2, Ada_Indent_Broken))), T7 => (False, (Hanging_1,
(Anchored_1, T2, Ada_Indent_Broken), (Anchored_1, T2, 2 * Ada_Indent_Broken)))));
end case;
end parameter_specification_0;
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)
is
Parse_Data : Wisi.Parse_Data_Type renames Wisi.Parse_Data_Type (User_Data);
T1 : constant SAL.Peek_Type := 1;
T2 : constant SAL.Peek_Type := 2;
T3 : constant SAL.Peek_Type := 3;
T4 : constant SAL.Peek_Type := 4;
T5 : constant SAL.Peek_Type := 5;
T6 : constant SAL.Peek_Type := 6;
begin
case Parse_Data.Post_Parse_Action is
when Navigate =>
null;
when Face =>
Face_Apply_Action (Parse_Data, Tree, Nonterm, (1 => (T6, 1, 2)));
when Indent =>
Indent_Action_0 (Parse_Data, Tree, Nonterm, (T1 => (False, (Simple, (Label => None))), T2 => (False, (Simple,
(Int, Ada_Indent_Broken))), T3 => (False, (Simple, (Int, Ada_Indent_Broken))), T4 => (False, (Simple, (Int,
Ada_Indent_Broken))), T5 => (False, (Simple, (Int, Ada_Indent_Broken))), T6 => (False, (Hanging_0,
(Anchored_1, T2, Ada_Indent_Broken), (Anchored_1, T2, Ada_Indent_Broken)))));
end case;
end parameter_specification_1;
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)
is
Parse_Data : Wisi.Parse_Data_Type renames Wisi.Parse_Data_Type (User_Data);
T1 : constant SAL.Peek_Type := 1;
T2 : constant SAL.Peek_Type := 2;
T3 : constant SAL.Peek_Type := 3;
T4 : constant SAL.Peek_Type := 4;
T6 : constant SAL.Peek_Type := 5;
T7 : constant SAL.Peek_Type := 6;
begin
case Parse_Data.Post_Parse_Action is
when Navigate =>
null;
when Face =>
Face_Apply_Action (Parse_Data, Tree, Nonterm, (1 => (T6, 1, 2)));
when Indent =>
Indent_Action_0 (Parse_Data, Tree, Nonterm, (T1 => (False, (Simple, (Label => None))), T2 => (False, (Simple,
(Int, Ada_Indent_Broken))), T3 => (False, (Simple, (Int, Ada_Indent_Broken))), T4 => (False, (Simple, (Int,
Ada_Indent_Broken))), T6 => (False, (Hanging_0, (Anchored_1, T2, Ada_Indent_Broken), (Anchored_1, T2,
Ada_Indent_Broken))), T7 => (False, (Hanging_1, (Anchored_1, T2, Ada_Indent_Broken), (Anchored_1, T2, 2 *
Ada_Indent_Broken)))));
end case;
end parameter_specification_2;
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)
is
Parse_Data : Wisi.Parse_Data_Type renames Wisi.Parse_Data_Type (User_Data);
T1 : constant SAL.Peek_Type := 1;
T2 : constant SAL.Peek_Type := 2;
T3 : constant SAL.Peek_Type := 3;
T4 : constant SAL.Peek_Type := 4;
T6 : constant SAL.Peek_Type := 5;
begin
case Parse_Data.Post_Parse_Action is
when Navigate =>
null;
when Face =>
Face_Apply_Action (Parse_Data, Tree, Nonterm, (1 => (T6, 1, 2)));
when Indent =>
Indent_Action_0 (Parse_Data, Tree, Nonterm, (T1 => (False, (Simple, (Label => None))), T2 => (False, (Simple,
(Int, Ada_Indent_Broken))), T3 => (False, (Simple, (Int, Ada_Indent_Broken))), T4 => (False, (Simple, (Int,
Ada_Indent_Broken))), T6 => (False, (Hanging_0, (Anchored_1, T2, Ada_Indent_Broken), (Anchored_1, T2,
Ada_Indent_Broken)))));
end case;
end parameter_specification_3;
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)
is
Parse_Data : Wisi.Parse_Data_Type renames Wisi.Parse_Data_Type (User_Data);
T1 : constant SAL.Peek_Type := 1;
T2 : constant SAL.Peek_Type := 2;
T4 : constant SAL.Peek_Type := 3;
T5 : constant SAL.Peek_Type := 4;
T6 : constant SAL.Peek_Type := 5;
T7 : constant SAL.Peek_Type := 6;
begin
case Parse_Data.Post_Parse_Action is
when Navigate =>
null;
when Face =>
Face_Apply_Action (Parse_Data, Tree, Nonterm, (1 => (T6, 1, 2)));
when Indent =>
Indent_Action_0 (Parse_Data, Tree, Nonterm, (T1 => (False, (Simple, (Label => None))), T2 => (False, (Simple,
(Int, Ada_Indent_Broken))), T4 => (False, (Simple, (Int, Ada_Indent_Broken))), T5 => (False, (Simple, (Int,
Ada_Indent_Broken))), T6 => (False, (Hanging_0, (Anchored_1, T2, Ada_Indent_Broken), (Anchored_1, T2,
Ada_Indent_Broken))), T7 => (False, (Hanging_1, (Anchored_1, T2, Ada_Indent_Broken), (Anchored_1, T2, 2 *
Ada_Indent_Broken)))));
end case;
end parameter_specification_4;
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)
is
Parse_Data : Wisi.Parse_Data_Type renames Wisi.Parse_Data_Type (User_Data);
T1 : constant SAL.Peek_Type := 1;
T2 : constant SAL.Peek_Type := 2;
T4 : constant SAL.Peek_Type := 3;
T5 : constant SAL.Peek_Type := 4;
T6 : constant SAL.Peek_Type := 5;
begin
case Parse_Data.Post_Parse_Action is
when Navigate =>
null;
when Face =>
Face_Apply_Action (Parse_Data, Tree, Nonterm, (1 => (T6, 1, 2)));
when Indent =>
Indent_Action_0 (Parse_Data, Tree, Nonterm, (T1 => (False, (Simple, (Label => None))), T2 => (False, (Simple,
(Int, Ada_Indent_Broken))), T4 => (False, (Simple, (Int, Ada_Indent_Broken))), T5 => (False, (Simple, (Int,
Ada_Indent_Broken))), T6 => (False, (Hanging_0, (Anchored_1, T2, Ada_Indent_Broken), (Anchored_1, T2,
Ada_Indent_Broken)))));
end case;
end parameter_specification_5;
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)
is
Parse_Data : Wisi.Parse_Data_Type renames Wisi.Parse_Data_Type (User_Data);
T1 : constant SAL.Peek_Type := 1;
T2 : constant SAL.Peek_Type := 2;
T4 : constant SAL.Peek_Type := 3;
T6 : constant SAL.Peek_Type := 4;
T7 : constant SAL.Peek_Type := 5;
begin
case Parse_Data.Post_Parse_Action is
when Navigate =>
null;
when Face =>
Face_Apply_Action (Parse_Data, Tree, Nonterm, (1 => (T6, 1, 2)));
when Indent =>
Indent_Action_0 (Parse_Data, Tree, Nonterm, (T1 => (False, (Simple, (Label => None))), T2 => (False, (Simple,
(Int, Ada_Indent_Broken))), T4 => (False, (Simple, (Int, Ada_Indent_Broken))), T6 => (False, (Hanging_0,
(Anchored_1, T2, Ada_Indent_Broken), (Anchored_1, T2, Ada_Indent_Broken))), T7 => (False, (Hanging_1,
(Anchored_1, T2, Ada_Indent_Broken), (Anchored_1, T2, 2 * Ada_Indent_Broken)))));
end case;
end parameter_specification_6;
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)
is
Parse_Data : Wisi.Parse_Data_Type renames Wisi.Parse_Data_Type (User_Data);
T1 : constant SAL.Peek_Type := 1;
T2 : constant SAL.Peek_Type := 2;
T4 : constant SAL.Peek_Type := 3;
T6 : constant SAL.Peek_Type := 4;
begin
case Parse_Data.Post_Parse_Action is
when Navigate =>
null;
when Face =>
Face_Apply_Action (Parse_Data, Tree, Nonterm, (1 => (T6, 1, 2)));
when Indent =>
Indent_Action_0 (Parse_Data, Tree, Nonterm, (T1 => (False, (Simple, (Label => None))), T2 => (False, (Simple,
(Int, Ada_Indent_Broken))), T4 => (False, (Simple, (Int, Ada_Indent_Broken))), T6 => (False, (Hanging_0,
(Anchored_1, T2, Ada_Indent_Broken), (Anchored_1, T2, Ada_Indent_Broken)))));
end case;
end parameter_specification_7;
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)
is
Parse_Data : Wisi.Parse_Data_Type renames Wisi.Parse_Data_Type (User_Data);
T1 : constant SAL.Peek_Type := 1;
T2 : constant SAL.Peek_Type := 2;
T3 : constant SAL.Peek_Type := 3;
T4 : constant SAL.Peek_Type := 4;
begin
case Parse_Data.Post_Parse_Action is
when Navigate =>
null;
when Face =>
null;
when Indent =>
Indent_Action_0 (Parse_Data, Tree, Nonterm, (T1 => (False, (Simple, (Label => None))), T2 => (False, (Simple,
(Int, Ada_Indent_Broken))), T3 => (False, (Simple, (Int, Ada_Indent_Broken))), T4 => (False, (Simple, (Int,
Ada_Indent_Broken)))));
end case;
end parameter_specification_8;
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)
is
Parse_Data : Wisi.Parse_Data_Type renames Wisi.Parse_Data_Type (User_Data);
T1 : constant SAL.Peek_Type := 1;
T2 : constant SAL.Peek_Type := 2;
T3 : constant SAL.Peek_Type := 3;
begin
case Parse_Data.Post_Parse_Action is
when Navigate =>
null;
when Face =>
null;
when Indent =>
Indent_Action_0 (Parse_Data, Tree, Nonterm, (T1 => (False, (Simple, (Label => None))), T2 => (False, (Simple,
(Int, Ada_Indent_Broken))), T3 => (False, (Simple, (Int, Ada_Indent_Broken)))));
end case;
end parameter_specification_9;
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
is
pragma Unreferenced (Recover_Active);
T1 : constant SAL.Peek_Type := 1;
begin
return Propagate_Name (Tree, Nonterm, Tokens, T1);
end name_opt_0_check;
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)
is
Parse_Data : Wisi.Parse_Data_Type renames Wisi.Parse_Data_Type (User_Data);
T1 : constant SAL.Peek_Type := 1;
T2 : constant SAL.Peek_Type := 2;
T3 : constant SAL.Peek_Type := 3;
T4 : constant SAL.Peek_Type := 4;
T5 : constant SAL.Peek_Type := 5;
T6 : constant SAL.Peek_Type := 6;
T7 : constant SAL.Peek_Type := 7;
T8 : constant SAL.Peek_Type := 8;
T9 : constant SAL.Peek_Type := 9;
T10 : constant SAL.Peek_Type := 10;
begin
case Parse_Data.Post_Parse_Action is
when Navigate =>
Statement_Action (Parse_Data, Tree, Nonterm, ((T1, Statement_Start), (T2, Statement_Override), (T4, Motion),
(T6, Motion), (T10, Statement_End)));
Motion_Action (Parse_Data, Tree, Nonterm, (Index_ID'(T1, Invalid_Token_ID) & Index_ID'(T2, Invalid_Token_ID) &
Index_ID'(T4, Invalid_Token_ID) & Index_ID'(T6, Invalid_Token_ID) & Index_ID'(T7, 63) & Index_ID'(T10,
Invalid_Token_ID)));
when Face =>
Face_Apply_Action (Parse_Data, Tree, Nonterm, (1 => (T9, 1, 1)));
when Indent =>
Indent_Action_0 (Parse_Data, Tree, Nonterm, (T1 => (False, (Simple, (Label => None))), T2 => (False, (Simple,
(Label => None))), T3 => (False, (Simple, (Label => None))), T4 => (False, (Simple, (Label => None))), T5 =>
(True, (Simple, (Block, Ada_Indent)), (Simple, (Int, Ada_Indent))), T6 => (False, (Simple, (Label => None))),
T7 => (True, (Simple, (Block, Ada_Indent)), (Simple, (Int, Ada_Indent))), T8 => (False, (Simple, (Label =>
None))), T9 => (False, (Simple, (Int, Ada_Indent_Broken))), T10 => (False, (Simple, (Int,
Ada_Indent_Broken)))));
end case;
end subprogram_body_0;
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
is
pragma Unreferenced (Nonterm, Recover_Active);
T2 : constant SAL.Peek_Type := 2;
T9 : constant SAL.Peek_Type := 9;
begin
return Match_Names (Tree, Tokens, T2, T9, End_Names_Optional);
end subprogram_body_0_check;
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)
is
Parse_Data : Wisi.Parse_Data_Type renames Wisi.Parse_Data_Type (User_Data);
T1 : constant SAL.Peek_Type := 1;
T2 : constant SAL.Peek_Type := 2;
T4 : constant SAL.Peek_Type := 3;
T5 : constant SAL.Peek_Type := 4;
T6 : constant SAL.Peek_Type := 5;
T7 : constant SAL.Peek_Type := 6;
T8 : constant SAL.Peek_Type := 7;
T9 : constant SAL.Peek_Type := 8;
T10 : constant SAL.Peek_Type := 9;
begin
case Parse_Data.Post_Parse_Action is
when Navigate =>
Statement_Action (Parse_Data, Tree, Nonterm, ((T1, Statement_Start), (T2, Statement_Override), (T4, Motion),
(T6, Motion), (T10, Statement_End)));
Motion_Action (Parse_Data, Tree, Nonterm, (Index_ID'(T1, Invalid_Token_ID) & Index_ID'(T2, Invalid_Token_ID) &
Index_ID'(T4, Invalid_Token_ID) & Index_ID'(T6, Invalid_Token_ID) & Index_ID'(T7, 63) & Index_ID'(T10,
Invalid_Token_ID)));
when Face =>
Face_Apply_Action (Parse_Data, Tree, Nonterm, (1 => (T9, 1, 1)));
when Indent =>
Indent_Action_0 (Parse_Data, Tree, Nonterm, (T1 => (False, (Simple, (Label => None))), T2 => (False, (Simple,
(Label => None))), T4 => (False, (Simple, (Label => None))), T5 => (True, (Simple, (Block, Ada_Indent)),
(Simple, (Int, Ada_Indent))), T6 => (False, (Simple, (Label => None))), T7 => (True, (Simple, (Block,
Ada_Indent)), (Simple, (Int, Ada_Indent))), T8 => (False, (Simple, (Label => None))), T9 => (False, (Simple,
(Int, Ada_Indent_Broken))), T10 => (False, (Simple, (Int, Ada_Indent_Broken)))));
end case;
end subprogram_body_1;
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
is
pragma Unreferenced (Nonterm, Recover_Active);
T2 : constant SAL.Peek_Type := 2;
T9 : constant SAL.Peek_Type := 8;
begin
return Match_Names (Tree, Tokens, T2, T9, End_Names_Optional);
end subprogram_body_1_check;
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)
is
Parse_Data : Wisi.Parse_Data_Type renames Wisi.Parse_Data_Type (User_Data);
T2 : constant SAL.Peek_Type := 1;
T3 : constant SAL.Peek_Type := 2;
T4 : constant SAL.Peek_Type := 3;
T5 : constant SAL.Peek_Type := 4;
T6 : constant SAL.Peek_Type := 5;
T7 : constant SAL.Peek_Type := 6;
T8 : constant SAL.Peek_Type := 7;
T9 : constant SAL.Peek_Type := 8;
T10 : constant SAL.Peek_Type := 9;
begin
case Parse_Data.Post_Parse_Action is
when Navigate =>
Statement_Action (Parse_Data, Tree, Nonterm, ((T2, Statement_Override), (T4, Motion), (T6, Motion), (T10,
Statement_End)));
Motion_Action (Parse_Data, Tree, Nonterm, (Index_ID'(T2, Invalid_Token_ID) & Index_ID'(T4, Invalid_Token_ID) &
Index_ID'(T6, Invalid_Token_ID) & Index_ID'(T7, 63) & Index_ID'(T10, Invalid_Token_ID)));
when Face =>
Face_Apply_Action (Parse_Data, Tree, Nonterm, (1 => (T9, 1, 1)));
when Indent =>
Indent_Action_0 (Parse_Data, Tree, Nonterm, (T2 => (False, (Simple, (Label => None))), T3 => (False, (Simple,
(Label => None))), T4 => (False, (Simple, (Label => None))), T5 => (True, (Simple, (Block, Ada_Indent)),
(Simple, (Int, Ada_Indent))), T6 => (False, (Simple, (Label => None))), T7 => (True, (Simple, (Block,
Ada_Indent)), (Simple, (Int, Ada_Indent))), T8 => (False, (Simple, (Label => None))), T9 => (False, (Simple,
(Int, Ada_Indent_Broken))), T10 => (False, (Simple, (Int, Ada_Indent_Broken)))));
end case;
end subprogram_body_2;
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
is
pragma Unreferenced (Nonterm, Recover_Active);
T2 : constant SAL.Peek_Type := 1;
T9 : constant SAL.Peek_Type := 8;
begin
return Match_Names (Tree, Tokens, T2, T9, End_Names_Optional);
end subprogram_body_2_check;
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)
is
Parse_Data : Wisi.Parse_Data_Type renames Wisi.Parse_Data_Type (User_Data);
T2 : constant SAL.Peek_Type := 1;
T4 : constant SAL.Peek_Type := 2;
T5 : constant SAL.Peek_Type := 3;
T6 : constant SAL.Peek_Type := 4;
T7 : constant SAL.Peek_Type := 5;
T8 : constant SAL.Peek_Type := 6;
T9 : constant SAL.Peek_Type := 7;
T10 : constant SAL.Peek_Type := 8;
begin
case Parse_Data.Post_Parse_Action is
when Navigate =>
Statement_Action (Parse_Data, Tree, Nonterm, ((T2, Statement_Override), (T4, Motion), (T6, Motion), (T10,
Statement_End)));
Motion_Action (Parse_Data, Tree, Nonterm, (Index_ID'(T2, Invalid_Token_ID) & Index_ID'(T4, Invalid_Token_ID) &
Index_ID'(T6, Invalid_Token_ID) & Index_ID'(T7, 63) & Index_ID'(T10, Invalid_Token_ID)));
when Face =>
Face_Apply_Action (Parse_Data, Tree, Nonterm, (1 => (T9, 1, 1)));
when Indent =>
Indent_Action_0 (Parse_Data, Tree, Nonterm, (T2 => (False, (Simple, (Label => None))), T4 => (False, (Simple,
(Label => None))), T5 => (True, (Simple, (Block, Ada_Indent)), (Simple, (Int, Ada_Indent))), T6 => (False,
(Simple, (Label => None))), T7 => (True, (Simple, (Block, Ada_Indent)), (Simple, (Int, Ada_Indent))), T8 =>
(False, (Simple, (Label => None))), T9 => (False, (Simple, (Int, Ada_Indent_Broken))), T10 => (False, (Simple,
(Int, Ada_Indent_Broken)))));
end case;
end subprogram_body_3;
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
is
pragma Unreferenced (Nonterm, Recover_Active);
T2 : constant SAL.Peek_Type := 1;
T9 : constant SAL.Peek_Type := 7;
begin
return Match_Names (Tree, Tokens, T2, T9, End_Names_Optional);
end subprogram_body_3_check;
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)
is
Parse_Data : Wisi.Parse_Data_Type renames Wisi.Parse_Data_Type (User_Data);
T1 : constant SAL.Peek_Type := 1;
T2 : constant SAL.Peek_Type := 2;
begin
case Parse_Data.Post_Parse_Action is
when Navigate =>
Statement_Action (Parse_Data, Tree, Nonterm, ((T1, Statement_Start), (T2, Statement_End)));
when Face =>
null;
when Indent =>
Indent_Action_0 (Parse_Data, Tree, Nonterm, (T1 => (False, (Hanging_0, (Label => None), (Int,
Ada_Indent_Broken))), T2 => (False, (Simple, (Int, Ada_Indent_Broken)))));
end case;
end procedure_call_statement_0;
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)
is
Parse_Data : Wisi.Parse_Data_Type renames Wisi.Parse_Data_Type (User_Data);
begin
case Parse_Data.Post_Parse_Action is
when Navigate =>
null;
when Face =>
null;
when Indent =>
Indent_Action_0 (Parse_Data, Tree, Nonterm, ((False, (Simple, (Label => None))), (False, (Simple, (Anchored_1,
1, Ada_Indent_Broken)))));
end case;
end function_call_0;
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)
is
Parse_Data : Wisi.Parse_Data_Type renames Wisi.Parse_Data_Type (User_Data);
T1 : constant SAL.Peek_Type := 1;
T2 : constant SAL.Peek_Type := 2;
T3 : constant SAL.Peek_Type := 3;
begin
case Parse_Data.Post_Parse_Action is
when Navigate =>
null;
when Face =>
null;
when Indent =>
Indent_Action_0 (Parse_Data, Tree, Nonterm, (T1 => (False, (Simple, (Label => None))), T2 => (True, (Simple,
(Anchored_0, T1, 1)), (Simple, (Anchored_0, T1, 1))), T3 => (False, (Simple, (Anchored_0, T1, 0)))));
end case;
end actual_parameter_part_0;
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)
is
Parse_Data : Wisi.Parse_Data_Type renames Wisi.Parse_Data_Type (User_Data);
T1 : constant SAL.Peek_Type := 1;
T2 : constant SAL.Peek_Type := 2;
T3 : constant SAL.Peek_Type := 3;
begin
case Parse_Data.Post_Parse_Action is
when Navigate =>
null;
when Face =>
null;
when Indent =>
Indent_Action_0 (Parse_Data, Tree, Nonterm, (T1 => (False, (Simple, (Label => None))), T2 => (True, (Simple,
(Anchored_0, T1, 1)), (Simple, (Anchored_0, T1, 1))), T3 => (False, (Simple, (Anchored_0, T1, 0)))));
end case;
end actual_parameter_part_1;
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)
is
Parse_Data : Wisi.Parse_Data_Type renames Wisi.Parse_Data_Type (User_Data);
T1 : constant SAL.Peek_Type := 1;
T2 : constant SAL.Peek_Type := 2;
T3 : constant SAL.Peek_Type := 3;
begin
case Parse_Data.Post_Parse_Action is
when Navigate =>
null;
when Face =>
null;
when Indent =>
Indent_Action_0 (Parse_Data, Tree, Nonterm, (T1 => (False, (Simple, (Label => None))), T2 => (True, (Simple,
(Anchored_0, T1, 1)), (Simple, (Anchored_0, T1, 1))), T3 => (False, (Simple, (Anchored_0, T1, 0)))));
end case;
end actual_parameter_part_2;
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)
is
Parse_Data : Wisi.Parse_Data_Type renames Wisi.Parse_Data_Type (User_Data);
T1 : constant SAL.Peek_Type := 1;
T2 : constant SAL.Peek_Type := 2;
T3 : constant SAL.Peek_Type := 3;
begin
case Parse_Data.Post_Parse_Action is
when Navigate =>
null;
when Face =>
null;
when Indent =>
Indent_Action_0 (Parse_Data, Tree, Nonterm, (T1 => (False, (Simple, (Label => None))), T2 => (True, (Simple,
(Anchored_0, T1, 1)), (Simple, (Anchored_0, T1, 1))), T3 => (False, (Simple, (Anchored_0, T1, 0)))));
end case;
end actual_parameter_part_3;
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)
is
Parse_Data : Wisi.Parse_Data_Type renames Wisi.Parse_Data_Type (User_Data);
T1 : constant SAL.Peek_Type := 1;
T2 : constant SAL.Peek_Type := 2;
begin
case Parse_Data.Post_Parse_Action is
when Navigate =>
null;
when Face =>
null;
when Indent =>
Indent_Action_0 (Parse_Data, Tree, Nonterm, (T1 => (False, (Simple, (Label => None))), T2 => (False,
(Hanging_1, (Anchored_1, T1, Ada_Indent_Broken), (Anchored_1, T1, 2 * Ada_Indent_Broken)))));
end case;
end assoc_expression_0;
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)
is
Parse_Data : Wisi.Parse_Data_Type renames Wisi.Parse_Data_Type (User_Data);
begin
case Parse_Data.Post_Parse_Action is
when Navigate =>
null;
when Face =>
null;
when Indent =>
Indent_Action_0 (Parse_Data, Tree, Nonterm, ((False, (Simple, (Label => None))), (False, (Simple, (Int,
Ada_Indent_Broken))), (False, (Simple, (Int, Ada_Indent_Broken)))));
end case;
end parameter_association_0;
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)
is
Parse_Data : Wisi.Parse_Data_Type renames Wisi.Parse_Data_Type (User_Data);
begin
case Parse_Data.Post_Parse_Action is
when Navigate =>
null;
when Face =>
null;
when Indent =>
Indent_Action_0 (Parse_Data, Tree, Nonterm, (1 => (False, (Hanging_0, (Label => None), (Int,
Ada_Indent_Broken)))));
end case;
end parameter_association_1;
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)
is
Parse_Data : Wisi.Parse_Data_Type renames Wisi.Parse_Data_Type (User_Data);
T1 : constant SAL.Peek_Type := 1;
T2 : constant SAL.Peek_Type := 2;
T3 : constant SAL.Peek_Type := 3;
begin
case Parse_Data.Post_Parse_Action is
when Navigate =>
Statement_Action (Parse_Data, Tree, Nonterm, ((T1, Statement_Start), (T3, Statement_End)));
when Face =>
null;
when Indent =>
Indent_Action_0 (Parse_Data, Tree, Nonterm, (T1 => (False, (Simple, (Label => None))), T2 => (False, (Simple,
(Int, Ada_Indent_Broken))), T3 => (False, (Simple, (Int, Ada_Indent_Broken)))));
end case;
end simple_return_statement_0;
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)
is
Parse_Data : Wisi.Parse_Data_Type renames Wisi.Parse_Data_Type (User_Data);
T1 : constant SAL.Peek_Type := 1;
T3 : constant SAL.Peek_Type := 2;
begin
case Parse_Data.Post_Parse_Action is
when Navigate =>
Statement_Action (Parse_Data, Tree, Nonterm, ((T1, Statement_Start), (T3, Statement_End)));
when Face =>
null;
when Indent =>
Indent_Action_0 (Parse_Data, Tree, Nonterm, (T1 => (False, (Simple, (Label => None))), T3 => (False, (Simple,
(Int, Ada_Indent_Broken)))));
end case;
end simple_return_statement_1;
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)
is
Parse_Data : Wisi.Parse_Data_Type renames Wisi.Parse_Data_Type (User_Data);
T1 : constant SAL.Peek_Type := 1;
T2 : constant SAL.Peek_Type := 2;
T3 : constant SAL.Peek_Type := 3;
T4 : constant SAL.Peek_Type := 4;
T5 : constant SAL.Peek_Type := 5;
T6 : constant SAL.Peek_Type := 6;
begin
case Parse_Data.Post_Parse_Action is
when Navigate =>
null;
when Face =>
null;
when Indent =>
Indent_Action_0 (Parse_Data, Tree, Nonterm, (T1 => (False, (Simple, (Label => None))), T2 => (False, (Simple,
(Label => None))), T3 => (False, (Simple, (Int, Ada_Indent_Broken))), T4 => (False, (Simple, (Int,
Ada_Indent_Broken))), T5 => (False, (Simple, (Int, Ada_Indent_Broken))), T6 => (False, (Hanging_1,
(Anchored_1, T5, Ada_Indent_Broken), (Anchored_1, T5, 2 * Ada_Indent_Broken)))));
end case;
end extended_return_object_declaration_0;
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)
is
Parse_Data : Wisi.Parse_Data_Type renames Wisi.Parse_Data_Type (User_Data);
T1 : constant SAL.Peek_Type := 1;
T2 : constant SAL.Peek_Type := 2;
T3 : constant SAL.Peek_Type := 3;
T4 : constant SAL.Peek_Type := 4;
T5 : constant SAL.Peek_Type := 5;
begin
case Parse_Data.Post_Parse_Action is
when Navigate =>
null;
when Face =>
null;
when Indent =>
Indent_Action_0 (Parse_Data, Tree, Nonterm, (T1 => (False, (Simple, (Label => None))), T2 => (False, (Simple,
(Label => None))), T3 => (False, (Simple, (Int, Ada_Indent_Broken))), T4 => (False, (Simple, (Int,
Ada_Indent_Broken))), T5 => (False, (Simple, (Int, Ada_Indent_Broken)))));
end case;
end extended_return_object_declaration_1;
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)
is
Parse_Data : Wisi.Parse_Data_Type renames Wisi.Parse_Data_Type (User_Data);
T1 : constant SAL.Peek_Type := 1;
T2 : constant SAL.Peek_Type := 2;
T3 : constant SAL.Peek_Type := 3;
T5 : constant SAL.Peek_Type := 4;
T6 : constant SAL.Peek_Type := 5;
begin
case Parse_Data.Post_Parse_Action is
when Navigate =>
null;
when Face =>
null;
when Indent =>
Indent_Action_0 (Parse_Data, Tree, Nonterm, (T1 => (False, (Simple, (Label => None))), T2 => (False, (Simple,
(Label => None))), T3 => (False, (Simple, (Int, Ada_Indent_Broken))), T5 => (False, (Simple, (Int,
Ada_Indent_Broken))), T6 => (False, (Hanging_1, (Anchored_1, T5, Ada_Indent_Broken), (Anchored_1, T5, 2 *
Ada_Indent_Broken)))));
end case;
end extended_return_object_declaration_2;
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)
is
Parse_Data : Wisi.Parse_Data_Type renames Wisi.Parse_Data_Type (User_Data);
T1 : constant SAL.Peek_Type := 1;
T2 : constant SAL.Peek_Type := 2;
T3 : constant SAL.Peek_Type := 3;
T5 : constant SAL.Peek_Type := 4;
begin
case Parse_Data.Post_Parse_Action is
when Navigate =>
null;
when Face =>
null;
when Indent =>
Indent_Action_0 (Parse_Data, Tree, Nonterm, (T1 => (False, (Simple, (Label => None))), T2 => (False, (Simple,
(Label => None))), T3 => (False, (Simple, (Int, Ada_Indent_Broken))), T5 => (False, (Simple, (Int,
Ada_Indent_Broken)))));
end case;
end extended_return_object_declaration_3;
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)
is
Parse_Data : Wisi.Parse_Data_Type renames Wisi.Parse_Data_Type (User_Data);
T1 : constant SAL.Peek_Type := 1;
T2 : constant SAL.Peek_Type := 2;
T4 : constant SAL.Peek_Type := 3;
T5 : constant SAL.Peek_Type := 4;
T6 : constant SAL.Peek_Type := 5;
begin
case Parse_Data.Post_Parse_Action is
when Navigate =>
null;
when Face =>
null;
when Indent =>
Indent_Action_0 (Parse_Data, Tree, Nonterm, (T1 => (False, (Simple, (Label => None))), T2 => (False, (Simple,
(Label => None))), T4 => (False, (Simple, (Int, Ada_Indent_Broken))), T5 => (False, (Simple, (Int,
Ada_Indent_Broken))), T6 => (False, (Hanging_1, (Anchored_1, T5, Ada_Indent_Broken), (Anchored_1, T5, 2 *
Ada_Indent_Broken)))));
end case;
end extended_return_object_declaration_4;
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)
is
Parse_Data : Wisi.Parse_Data_Type renames Wisi.Parse_Data_Type (User_Data);
T1 : constant SAL.Peek_Type := 1;
T2 : constant SAL.Peek_Type := 2;
T4 : constant SAL.Peek_Type := 3;
T5 : constant SAL.Peek_Type := 4;
begin
case Parse_Data.Post_Parse_Action is
when Navigate =>
null;
when Face =>
null;
when Indent =>
Indent_Action_0 (Parse_Data, Tree, Nonterm, (T1 => (False, (Simple, (Label => None))), T2 => (False, (Simple,
(Label => None))), T4 => (False, (Simple, (Int, Ada_Indent_Broken))), T5 => (False, (Simple, (Int,
Ada_Indent_Broken)))));
end case;
end extended_return_object_declaration_5;
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)
is
Parse_Data : Wisi.Parse_Data_Type renames Wisi.Parse_Data_Type (User_Data);
T1 : constant SAL.Peek_Type := 1;
T2 : constant SAL.Peek_Type := 2;
T5 : constant SAL.Peek_Type := 3;
T6 : constant SAL.Peek_Type := 4;
begin
case Parse_Data.Post_Parse_Action is
when Navigate =>
null;
when Face =>
null;
when Indent =>
Indent_Action_0 (Parse_Data, Tree, Nonterm, (T1 => (False, (Simple, (Label => None))), T2 => (False, (Simple,
(Label => None))), T5 => (False, (Simple, (Int, Ada_Indent_Broken))), T6 => (False, (Hanging_1, (Anchored_1,
T5, Ada_Indent_Broken), (Anchored_1, T5, 2 * Ada_Indent_Broken)))));
end case;
end extended_return_object_declaration_6;
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)
is
Parse_Data : Wisi.Parse_Data_Type renames Wisi.Parse_Data_Type (User_Data);
T1 : constant SAL.Peek_Type := 1;
T2 : constant SAL.Peek_Type := 2;
T5 : constant SAL.Peek_Type := 3;
begin
case Parse_Data.Post_Parse_Action is
when Navigate =>
null;
when Face =>
null;
when Indent =>
Indent_Action_0 (Parse_Data, Tree, Nonterm, (T1 => (False, (Simple, (Label => None))), T2 => (False, (Simple,
(Label => None))), T5 => (False, (Simple, (Int, Ada_Indent_Broken)))));
end case;
end extended_return_object_declaration_7;
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)
is
Parse_Data : Wisi.Parse_Data_Type renames Wisi.Parse_Data_Type (User_Data);
T1 : constant SAL.Peek_Type := 1;
T2 : constant SAL.Peek_Type := 2;
T3 : constant SAL.Peek_Type := 3;
T4 : constant SAL.Peek_Type := 4;
T5 : constant SAL.Peek_Type := 5;
T6 : constant SAL.Peek_Type := 6;
T7 : constant SAL.Peek_Type := 7;
begin
case Parse_Data.Post_Parse_Action is
when Navigate =>
Statement_Action (Parse_Data, Tree, Nonterm, ((T1, Statement_Start), (T3, Motion), (T7, Statement_End)));
Motion_Action (Parse_Data, Tree, Nonterm, (Index_ID'(T1, Invalid_Token_ID) & Index_ID'(T3, Invalid_Token_ID) &
Index_ID'(T4, 63) & Index_ID'(T7, Invalid_Token_ID)));
when Face =>
null;
when Indent =>
Indent_Action_0 (Parse_Data, Tree, Nonterm, (T1 => (True, (Simple, (Label => None)), (Simple, (Int,
Ada_Indent))), T2 => (False, (Simple, (Int, Ada_Indent_Broken))), T3 => (False, (Simple, (Label => None))), T4
=> (True, (Simple, (Block, Ada_Indent)), (Simple, (Int, Ada_Indent))), T5 => (False, (Simple, (Label =>
None))), T6 => (False, (Simple, (Int, Ada_Indent_Broken))), T7 => (False, (Simple, (Int,
Ada_Indent_Broken)))));
end case;
end extended_return_statement_0;
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)
is
Parse_Data : Wisi.Parse_Data_Type renames Wisi.Parse_Data_Type (User_Data);
T1 : constant SAL.Peek_Type := 1;
T2 : constant SAL.Peek_Type := 2;
T7 : constant SAL.Peek_Type := 3;
begin
case Parse_Data.Post_Parse_Action is
when Navigate =>
Statement_Action (Parse_Data, Tree, Nonterm, ((T1, Statement_Start), (T7, Statement_End)));
Motion_Action (Parse_Data, Tree, Nonterm, (Index_ID'(T1, Invalid_Token_ID) & Index_ID'(T7,
Invalid_Token_ID)));
when Face =>
null;
when Indent =>
Indent_Action_0 (Parse_Data, Tree, Nonterm, (T1 => (True, (Simple, (Label => None)), (Simple, (Int,
Ada_Indent))), T2 => (False, (Simple, (Int, Ada_Indent_Broken))), T7 => (False, (Simple, (Int,
Ada_Indent_Broken)))));
end case;
end extended_return_statement_1;
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)
is
Parse_Data : Wisi.Parse_Data_Type renames Wisi.Parse_Data_Type (User_Data);
T1 : constant SAL.Peek_Type := 1;
T2 : constant SAL.Peek_Type := 2;
T3 : constant SAL.Peek_Type := 3;
T4 : constant SAL.Peek_Type := 4;
T5 : constant SAL.Peek_Type := 5;
T6 : constant SAL.Peek_Type := 6;
begin
case Parse_Data.Post_Parse_Action is
when Navigate =>
Statement_Action (Parse_Data, Tree, Nonterm, ((T1, Statement_Start), (T2, Statement_Override), (T6,
Statement_End)));
when Face =>
null;
when Indent =>
Indent_Action_0 (Parse_Data, Tree, Nonterm, (T1 => (False, (Simple, (Label => None))), T2 => (False, (Simple,
(Label => None))), T3 => (False, (Simple, (Int, Ada_Indent_Subprogram_Is))), T4 => (False, (Simple, (Int,
Ada_Indent_Broken))), T5 => (False, (Simple, (Label => None))), T6 => (False, (Simple, (Int,
Ada_Indent_Broken)))));
end case;
end null_procedure_declaration_0;
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)
is
Parse_Data : Wisi.Parse_Data_Type renames Wisi.Parse_Data_Type (User_Data);
T1 : constant SAL.Peek_Type := 1;
T2 : constant SAL.Peek_Type := 2;
T3 : constant SAL.Peek_Type := 3;
T4 : constant SAL.Peek_Type := 4;
T6 : constant SAL.Peek_Type := 5;
begin
case Parse_Data.Post_Parse_Action is
when Navigate =>
Statement_Action (Parse_Data, Tree, Nonterm, ((T1, Statement_Start), (T2, Statement_Override), (T6,
Statement_End)));
when Face =>
null;
when Indent =>
Indent_Action_0 (Parse_Data, Tree, Nonterm, (T1 => (False, (Simple, (Label => None))), T2 => (False, (Simple,
(Label => None))), T3 => (False, (Simple, (Int, Ada_Indent_Subprogram_Is))), T4 => (False, (Simple, (Int,
Ada_Indent_Broken))), T6 => (False, (Simple, (Int, Ada_Indent_Broken)))));
end case;
end null_procedure_declaration_1;
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)
is
Parse_Data : Wisi.Parse_Data_Type renames Wisi.Parse_Data_Type (User_Data);
T2 : constant SAL.Peek_Type := 1;
T3 : constant SAL.Peek_Type := 2;
T4 : constant SAL.Peek_Type := 3;
T5 : constant SAL.Peek_Type := 4;
T6 : constant SAL.Peek_Type := 5;
begin
case Parse_Data.Post_Parse_Action is
when Navigate =>
Statement_Action (Parse_Data, Tree, Nonterm, ((T2, Statement_Override), (T6, Statement_End)));
when Face =>
null;
when Indent =>
Indent_Action_0 (Parse_Data, Tree, Nonterm, (T2 => (False, (Simple, (Label => None))), T3 => (False, (Simple,
(Int, Ada_Indent_Subprogram_Is))), T4 => (False, (Simple, (Int, Ada_Indent_Broken))), T5 => (False, (Simple,
(Label => None))), T6 => (False, (Simple, (Int, Ada_Indent_Broken)))));
end case;
end null_procedure_declaration_2;
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)
is
Parse_Data : Wisi.Parse_Data_Type renames Wisi.Parse_Data_Type (User_Data);
T2 : constant SAL.Peek_Type := 1;
T3 : constant SAL.Peek_Type := 2;
T4 : constant SAL.Peek_Type := 3;
T6 : constant SAL.Peek_Type := 4;
begin
case Parse_Data.Post_Parse_Action is
when Navigate =>
Statement_Action (Parse_Data, Tree, Nonterm, ((T2, Statement_Override), (T6, Statement_End)));
when Face =>
null;
when Indent =>
Indent_Action_0 (Parse_Data, Tree, Nonterm, (T2 => (False, (Simple, (Label => None))), T3 => (False, (Simple,
(Int, Ada_Indent_Subprogram_Is))), T4 => (False, (Simple, (Int, Ada_Indent_Broken))), T6 => (False, (Simple,
(Int, Ada_Indent_Broken)))));
end case;
end null_procedure_declaration_3;
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)
is
Parse_Data : Wisi.Parse_Data_Type renames Wisi.Parse_Data_Type (User_Data);
T1 : constant SAL.Peek_Type := 1;
T2 : constant SAL.Peek_Type := 2;
T3 : constant SAL.Peek_Type := 3;
T4 : constant SAL.Peek_Type := 4;
T5 : constant SAL.Peek_Type := 5;
T6 : constant SAL.Peek_Type := 6;
begin
case Parse_Data.Post_Parse_Action is
when Navigate =>
Statement_Action (Parse_Data, Tree, Nonterm, ((T1, Statement_Start), (T2, Statement_Override), (T6,
Statement_End)));
when Face =>
null;
when Indent =>
Indent_Action_0 (Parse_Data, Tree, Nonterm, (T1 => (False, (Simple, (Label => None))), T2 => (False, (Simple,
(Label => None))), T3 => (False, (Simple, (Int, Ada_Indent_Subprogram_Is))), T4 => (False, (Simple, (Int,
Ada_Indent_Broken))), T5 => (False, (Simple, (Label => None))), T6 => (False, (Simple, (Int,
Ada_Indent_Broken)))));
end case;
end expression_function_declaration_0;
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)
is
Parse_Data : Wisi.Parse_Data_Type renames Wisi.Parse_Data_Type (User_Data);
T1 : constant SAL.Peek_Type := 1;
T2 : constant SAL.Peek_Type := 2;
T3 : constant SAL.Peek_Type := 3;
T4 : constant SAL.Peek_Type := 4;
T6 : constant SAL.Peek_Type := 5;
begin
case Parse_Data.Post_Parse_Action is
when Navigate =>
Statement_Action (Parse_Data, Tree, Nonterm, ((T1, Statement_Start), (T2, Statement_Override), (T6,
Statement_End)));
when Face =>
null;
when Indent =>
Indent_Action_0 (Parse_Data, Tree, Nonterm, (T1 => (False, (Simple, (Label => None))), T2 => (False, (Simple,
(Label => None))), T3 => (False, (Simple, (Int, Ada_Indent_Subprogram_Is))), T4 => (False, (Simple, (Int,
Ada_Indent_Broken))), T6 => (False, (Simple, (Int, Ada_Indent_Broken)))));
end case;
end expression_function_declaration_1;
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)
is
Parse_Data : Wisi.Parse_Data_Type renames Wisi.Parse_Data_Type (User_Data);
T2 : constant SAL.Peek_Type := 1;
T3 : constant SAL.Peek_Type := 2;
T4 : constant SAL.Peek_Type := 3;
T5 : constant SAL.Peek_Type := 4;
T6 : constant SAL.Peek_Type := 5;
begin
case Parse_Data.Post_Parse_Action is
when Navigate =>
Statement_Action (Parse_Data, Tree, Nonterm, ((T2, Statement_Override), (T6, Statement_End)));
when Face =>
null;
when Indent =>
Indent_Action_0 (Parse_Data, Tree, Nonterm, (T2 => (False, (Simple, (Label => None))), T3 => (False, (Simple,
(Int, Ada_Indent_Subprogram_Is))), T4 => (False, (Simple, (Int, Ada_Indent_Broken))), T5 => (False, (Simple,
(Label => None))), T6 => (False, (Simple, (Int, Ada_Indent_Broken)))));
end case;
end expression_function_declaration_2;
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)
is
Parse_Data : Wisi.Parse_Data_Type renames Wisi.Parse_Data_Type (User_Data);
T2 : constant SAL.Peek_Type := 1;
T3 : constant SAL.Peek_Type := 2;
T4 : constant SAL.Peek_Type := 3;
T6 : constant SAL.Peek_Type := 4;
begin
case Parse_Data.Post_Parse_Action is
when Navigate =>
Statement_Action (Parse_Data, Tree, Nonterm, ((T2, Statement_Override), (T6, Statement_End)));
when Face =>
null;
when Indent =>
Indent_Action_0 (Parse_Data, Tree, Nonterm, (T2 => (False, (Simple, (Label => None))), T3 => (False, (Simple,
(Int, Ada_Indent_Subprogram_Is))), T4 => (False, (Simple, (Int, Ada_Indent_Broken))), T6 => (False, (Simple,
(Int, Ada_Indent_Broken)))));
end case;
end expression_function_declaration_3;
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)
is
Parse_Data : Wisi.Parse_Data_Type renames Wisi.Parse_Data_Type (User_Data);
T1 : constant SAL.Peek_Type := 1;
T2 : constant SAL.Peek_Type := 2;
begin
case Parse_Data.Post_Parse_Action is
when Navigate =>
Statement_Action (Parse_Data, Tree, Nonterm, ((T1, Statement_Start), (T2, Statement_End)));
Motion_Action (Parse_Data, Tree, Nonterm, (Index_ID'(T1, Invalid_Token_ID) & Index_ID'(T2,
Invalid_Token_ID)));
when Face =>
null;
when Indent =>
null;
end case;
end package_declaration_0;
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)
is
Parse_Data : Wisi.Parse_Data_Type renames Wisi.Parse_Data_Type (User_Data);
T1 : constant SAL.Peek_Type := 1;
T2 : constant SAL.Peek_Type := 2;
T3 : constant SAL.Peek_Type := 3;
T4 : constant SAL.Peek_Type := 4;
T5 : constant SAL.Peek_Type := 5;
T6 : constant SAL.Peek_Type := 6;
T7 : constant SAL.Peek_Type := 7;
T8 : constant SAL.Peek_Type := 8;
T9 : constant SAL.Peek_Type := 9;
begin
case Parse_Data.Post_Parse_Action is
when Navigate =>
Statement_Action (Parse_Data, Tree, Nonterm, ((T1, Statement_Start), (T4, Motion), (T6, Motion)));
Name_Action (Parse_Data, Tree, Nonterm, T2);
Motion_Action (Parse_Data, Tree, Nonterm, (Index_ID'(T1, Invalid_Token_ID) & Index_ID'(T4, Invalid_Token_ID) &
Index_ID'(T6, Invalid_Token_ID)));
when Face =>
Face_Apply_Action (Parse_Data, Tree, Nonterm, ((T2, 1, 1), (T9, 1, 1)));
when Indent =>
Indent_Action_0 (Parse_Data, Tree, Nonterm, (T1 => (False, (Simple, (Label => None))), T2 => (False,
(Hanging_2, (Int, Ada_Indent_Broken), (Int, Ada_Indent_Broken))), T3 => (False, (Simple, (Label => None))), T4
=> (False, (Simple, (Label => None))), T5 => (True, (Simple, (Block, Ada_Indent)), (Simple, (Int,
Ada_Indent))), T6 => (False, (Simple, (Label => None))), T7 => (True, (Simple, (Block, Ada_Indent)), (Simple,
(Int, Ada_Indent))), T8 => (False, (Simple, (Label => None))), T9 => (False, (Hanging_2, (Int,
Ada_Indent_Broken), (Int, Ada_Indent_Broken)))));
end case;
end package_specification_0;
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
is
pragma Unreferenced (Nonterm, Recover_Active);
T2 : constant SAL.Peek_Type := 2;
T9 : constant SAL.Peek_Type := 9;
begin
return Match_Names (Tree, Tokens, T2, T9, End_Names_Optional);
end package_specification_0_check;
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)
is
Parse_Data : Wisi.Parse_Data_Type renames Wisi.Parse_Data_Type (User_Data);
T1 : constant SAL.Peek_Type := 1;
T2 : constant SAL.Peek_Type := 2;
T3 : constant SAL.Peek_Type := 3;
T4 : constant SAL.Peek_Type := 4;
T5 : constant SAL.Peek_Type := 5;
T6 : constant SAL.Peek_Type := 6;
T8 : constant SAL.Peek_Type := 7;
T9 : constant SAL.Peek_Type := 8;
begin
case Parse_Data.Post_Parse_Action is
when Navigate =>
Statement_Action (Parse_Data, Tree, Nonterm, ((T1, Statement_Start), (T4, Motion), (T6, Motion)));
Name_Action (Parse_Data, Tree, Nonterm, T2);
Motion_Action (Parse_Data, Tree, Nonterm, (Index_ID'(T1, Invalid_Token_ID) & Index_ID'(T4, Invalid_Token_ID) &
Index_ID'(T6, Invalid_Token_ID)));
when Face =>
Face_Apply_Action (Parse_Data, Tree, Nonterm, ((T2, 1, 1), (T9, 1, 1)));
when Indent =>
Indent_Action_0 (Parse_Data, Tree, Nonterm, (T1 => (False, (Simple, (Label => None))), T2 => (False,
(Hanging_2, (Int, Ada_Indent_Broken), (Int, Ada_Indent_Broken))), T3 => (False, (Simple, (Label => None))), T4
=> (False, (Simple, (Label => None))), T5 => (True, (Simple, (Block, Ada_Indent)), (Simple, (Int,
Ada_Indent))), T6 => (False, (Simple, (Label => None))), T8 => (False, (Simple, (Label => None))), T9 =>
(False, (Hanging_2, (Int, Ada_Indent_Broken), (Int, Ada_Indent_Broken)))));
end case;
end package_specification_1;
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
is
pragma Unreferenced (Nonterm, Recover_Active);
T2 : constant SAL.Peek_Type := 2;
T9 : constant SAL.Peek_Type := 8;
begin
return Match_Names (Tree, Tokens, T2, T9, End_Names_Optional);
end package_specification_1_check;
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)
is
Parse_Data : Wisi.Parse_Data_Type renames Wisi.Parse_Data_Type (User_Data);
T1 : constant SAL.Peek_Type := 1;
T2 : constant SAL.Peek_Type := 2;
T3 : constant SAL.Peek_Type := 3;
T4 : constant SAL.Peek_Type := 4;
T5 : constant SAL.Peek_Type := 5;
T8 : constant SAL.Peek_Type := 6;
T9 : constant SAL.Peek_Type := 7;
begin
case Parse_Data.Post_Parse_Action is
when Navigate =>
Statement_Action (Parse_Data, Tree, Nonterm, ((T1, Statement_Start), (T4, Motion)));
Name_Action (Parse_Data, Tree, Nonterm, T2);
Motion_Action (Parse_Data, Tree, Nonterm, (Index_ID'(T1, Invalid_Token_ID) & Index_ID'(T4,
Invalid_Token_ID)));
when Face =>
Face_Apply_Action (Parse_Data, Tree, Nonterm, ((T2, 1, 1), (T9, 1, 1)));
when Indent =>
Indent_Action_0 (Parse_Data, Tree, Nonterm, (T1 => (False, (Simple, (Label => None))), T2 => (False,
(Hanging_2, (Int, Ada_Indent_Broken), (Int, Ada_Indent_Broken))), T3 => (False, (Simple, (Label => None))), T4
=> (False, (Simple, (Label => None))), T5 => (True, (Simple, (Block, Ada_Indent)), (Simple, (Int,
Ada_Indent))), T8 => (False, (Simple, (Label => None))), T9 => (False, (Hanging_2, (Int, Ada_Indent_Broken),
(Int, Ada_Indent_Broken)))));
end case;
end package_specification_2;
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
is
pragma Unreferenced (Nonterm, Recover_Active);
T2 : constant SAL.Peek_Type := 2;
T9 : constant SAL.Peek_Type := 7;
begin
return Match_Names (Tree, Tokens, T2, T9, End_Names_Optional);
end package_specification_2_check;
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)
is
Parse_Data : Wisi.Parse_Data_Type renames Wisi.Parse_Data_Type (User_Data);
T1 : constant SAL.Peek_Type := 1;
T2 : constant SAL.Peek_Type := 2;
T3 : constant SAL.Peek_Type := 3;
T4 : constant SAL.Peek_Type := 4;
T6 : constant SAL.Peek_Type := 5;
T7 : constant SAL.Peek_Type := 6;
T8 : constant SAL.Peek_Type := 7;
T9 : constant SAL.Peek_Type := 8;
begin
case Parse_Data.Post_Parse_Action is
when Navigate =>
Statement_Action (Parse_Data, Tree, Nonterm, ((T1, Statement_Start), (T4, Motion), (T6, Motion)));
Name_Action (Parse_Data, Tree, Nonterm, T2);
Motion_Action (Parse_Data, Tree, Nonterm, (Index_ID'(T1, Invalid_Token_ID) & Index_ID'(T4, Invalid_Token_ID) &
Index_ID'(T6, Invalid_Token_ID)));
when Face =>
Face_Apply_Action (Parse_Data, Tree, Nonterm, ((T2, 1, 1), (T9, 1, 1)));
when Indent =>
Indent_Action_0 (Parse_Data, Tree, Nonterm, (T1 => (False, (Simple, (Label => None))), T2 => (False,
(Hanging_2, (Int, Ada_Indent_Broken), (Int, Ada_Indent_Broken))), T3 => (False, (Simple, (Label => None))), T4
=> (False, (Simple, (Label => None))), T6 => (False, (Simple, (Label => None))), T7 => (True, (Simple, (Block,
Ada_Indent)), (Simple, (Int, Ada_Indent))), T8 => (False, (Simple, (Label => None))), T9 => (False,
(Hanging_2, (Int, Ada_Indent_Broken), (Int, Ada_Indent_Broken)))));
end case;
end package_specification_3;
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
is
pragma Unreferenced (Nonterm, Recover_Active);
T2 : constant SAL.Peek_Type := 2;
T9 : constant SAL.Peek_Type := 8;
begin
return Match_Names (Tree, Tokens, T2, T9, End_Names_Optional);
end package_specification_3_check;
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)
is
Parse_Data : Wisi.Parse_Data_Type renames Wisi.Parse_Data_Type (User_Data);
T1 : constant SAL.Peek_Type := 1;
T2 : constant SAL.Peek_Type := 2;
T3 : constant SAL.Peek_Type := 3;
T4 : constant SAL.Peek_Type := 4;
T6 : constant SAL.Peek_Type := 5;
T8 : constant SAL.Peek_Type := 6;
T9 : constant SAL.Peek_Type := 7;
begin
case Parse_Data.Post_Parse_Action is
when Navigate =>
Statement_Action (Parse_Data, Tree, Nonterm, ((T1, Statement_Start), (T4, Motion), (T6, Motion)));
Name_Action (Parse_Data, Tree, Nonterm, T2);
Motion_Action (Parse_Data, Tree, Nonterm, (Index_ID'(T1, Invalid_Token_ID) & Index_ID'(T4, Invalid_Token_ID) &
Index_ID'(T6, Invalid_Token_ID)));
when Face =>
Face_Apply_Action (Parse_Data, Tree, Nonterm, ((T2, 1, 1), (T9, 1, 1)));
when Indent =>
Indent_Action_0 (Parse_Data, Tree, Nonterm, (T1 => (False, (Simple, (Label => None))), T2 => (False,
(Hanging_2, (Int, Ada_Indent_Broken), (Int, Ada_Indent_Broken))), T3 => (False, (Simple, (Label => None))), T4
=> (False, (Simple, (Label => None))), T6 => (False, (Simple, (Label => None))), T8 => (False, (Simple, (Label
=> None))), T9 => (False, (Hanging_2, (Int, Ada_Indent_Broken), (Int, Ada_Indent_Broken)))));
end case;
end package_specification_4;
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
is
pragma Unreferenced (Nonterm, Recover_Active);
T2 : constant SAL.Peek_Type := 2;
T9 : constant SAL.Peek_Type := 7;
begin
return Match_Names (Tree, Tokens, T2, T9, End_Names_Optional);
end package_specification_4_check;
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)
is
Parse_Data : Wisi.Parse_Data_Type renames Wisi.Parse_Data_Type (User_Data);
T1 : constant SAL.Peek_Type := 1;
T2 : constant SAL.Peek_Type := 2;
T3 : constant SAL.Peek_Type := 3;
T4 : constant SAL.Peek_Type := 4;
T8 : constant SAL.Peek_Type := 5;
T9 : constant SAL.Peek_Type := 6;
begin
case Parse_Data.Post_Parse_Action is
when Navigate =>
Statement_Action (Parse_Data, Tree, Nonterm, ((T1, Statement_Start), (T4, Motion)));
Name_Action (Parse_Data, Tree, Nonterm, T2);
Motion_Action (Parse_Data, Tree, Nonterm, (Index_ID'(T1, Invalid_Token_ID) & Index_ID'(T4,
Invalid_Token_ID)));
when Face =>
Face_Apply_Action (Parse_Data, Tree, Nonterm, ((T2, 1, 1), (T9, 1, 1)));
when Indent =>
Indent_Action_0 (Parse_Data, Tree, Nonterm, (T1 => (False, (Simple, (Label => None))), T2 => (False,
(Hanging_2, (Int, Ada_Indent_Broken), (Int, Ada_Indent_Broken))), T3 => (False, (Simple, (Label => None))), T4
=> (False, (Simple, (Label => None))), T8 => (False, (Simple, (Label => None))), T9 => (False, (Hanging_2,
(Int, Ada_Indent_Broken), (Int, Ada_Indent_Broken)))));
end case;
end package_specification_5;
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
is
pragma Unreferenced (Nonterm, Recover_Active);
T2 : constant SAL.Peek_Type := 2;
T9 : constant SAL.Peek_Type := 6;
begin
return Match_Names (Tree, Tokens, T2, T9, End_Names_Optional);
end package_specification_5_check;
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)
is
Parse_Data : Wisi.Parse_Data_Type renames Wisi.Parse_Data_Type (User_Data);
T1 : constant SAL.Peek_Type := 1;
T2 : constant SAL.Peek_Type := 2;
T4 : constant SAL.Peek_Type := 3;
T5 : constant SAL.Peek_Type := 4;
T6 : constant SAL.Peek_Type := 5;
T7 : constant SAL.Peek_Type := 6;
T8 : constant SAL.Peek_Type := 7;
T9 : constant SAL.Peek_Type := 8;
begin
case Parse_Data.Post_Parse_Action is
when Navigate =>
Statement_Action (Parse_Data, Tree, Nonterm, ((T1, Statement_Start), (T4, Motion), (T6, Motion)));
Name_Action (Parse_Data, Tree, Nonterm, T2);
Motion_Action (Parse_Data, Tree, Nonterm, (Index_ID'(T1, Invalid_Token_ID) & Index_ID'(T4, Invalid_Token_ID) &
Index_ID'(T6, Invalid_Token_ID)));
when Face =>
Face_Apply_Action (Parse_Data, Tree, Nonterm, ((T2, 1, 1), (T9, 1, 1)));
when Indent =>
Indent_Action_0 (Parse_Data, Tree, Nonterm, (T1 => (False, (Simple, (Label => None))), T2 => (False,
(Hanging_2, (Int, Ada_Indent_Broken), (Int, Ada_Indent_Broken))), T4 => (False, (Simple, (Label => None))), T5
=> (True, (Simple, (Block, Ada_Indent)), (Simple, (Int, Ada_Indent))), T6 => (False, (Simple, (Label =>
None))), T7 => (True, (Simple, (Block, Ada_Indent)), (Simple, (Int, Ada_Indent))), T8 => (False, (Simple,
(Label => None))), T9 => (False, (Hanging_2, (Int, Ada_Indent_Broken), (Int, Ada_Indent_Broken)))));
end case;
end package_specification_6;
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
is
pragma Unreferenced (Nonterm, Recover_Active);
T2 : constant SAL.Peek_Type := 2;
T9 : constant SAL.Peek_Type := 8;
begin
return Match_Names (Tree, Tokens, T2, T9, End_Names_Optional);
end package_specification_6_check;
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)
is
Parse_Data : Wisi.Parse_Data_Type renames Wisi.Parse_Data_Type (User_Data);
T1 : constant SAL.Peek_Type := 1;
T2 : constant SAL.Peek_Type := 2;
T4 : constant SAL.Peek_Type := 3;
T5 : constant SAL.Peek_Type := 4;
T6 : constant SAL.Peek_Type := 5;
T8 : constant SAL.Peek_Type := 6;
T9 : constant SAL.Peek_Type := 7;
begin
case Parse_Data.Post_Parse_Action is
when Navigate =>
Statement_Action (Parse_Data, Tree, Nonterm, ((T1, Statement_Start), (T4, Motion), (T6, Motion)));
Name_Action (Parse_Data, Tree, Nonterm, T2);
Motion_Action (Parse_Data, Tree, Nonterm, (Index_ID'(T1, Invalid_Token_ID) & Index_ID'(T4, Invalid_Token_ID) &
Index_ID'(T6, Invalid_Token_ID)));
when Face =>
Face_Apply_Action (Parse_Data, Tree, Nonterm, ((T2, 1, 1), (T9, 1, 1)));
when Indent =>
Indent_Action_0 (Parse_Data, Tree, Nonterm, (T1 => (False, (Simple, (Label => None))), T2 => (False,
(Hanging_2, (Int, Ada_Indent_Broken), (Int, Ada_Indent_Broken))), T4 => (False, (Simple, (Label => None))), T5
=> (True, (Simple, (Block, Ada_Indent)), (Simple, (Int, Ada_Indent))), T6 => (False, (Simple, (Label =>
None))), T8 => (False, (Simple, (Label => None))), T9 => (False, (Hanging_2, (Int, Ada_Indent_Broken), (Int,
Ada_Indent_Broken)))));
end case;
end package_specification_7;
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
is
pragma Unreferenced (Nonterm, Recover_Active);
T2 : constant SAL.Peek_Type := 2;
T9 : constant SAL.Peek_Type := 7;
begin
return Match_Names (Tree, Tokens, T2, T9, End_Names_Optional);
end package_specification_7_check;
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)
is
Parse_Data : Wisi.Parse_Data_Type renames Wisi.Parse_Data_Type (User_Data);
T1 : constant SAL.Peek_Type := 1;
T2 : constant SAL.Peek_Type := 2;
T4 : constant SAL.Peek_Type := 3;
T5 : constant SAL.Peek_Type := 4;
T8 : constant SAL.Peek_Type := 5;
T9 : constant SAL.Peek_Type := 6;
begin
case Parse_Data.Post_Parse_Action is
when Navigate =>
Statement_Action (Parse_Data, Tree, Nonterm, ((T1, Statement_Start), (T4, Motion)));
Name_Action (Parse_Data, Tree, Nonterm, T2);
Motion_Action (Parse_Data, Tree, Nonterm, (Index_ID'(T1, Invalid_Token_ID) & Index_ID'(T4,
Invalid_Token_ID)));
when Face =>
Face_Apply_Action (Parse_Data, Tree, Nonterm, ((T2, 1, 1), (T9, 1, 1)));
when Indent =>
Indent_Action_0 (Parse_Data, Tree, Nonterm, (T1 => (False, (Simple, (Label => None))), T2 => (False,
(Hanging_2, (Int, Ada_Indent_Broken), (Int, Ada_Indent_Broken))), T4 => (False, (Simple, (Label => None))), T5
=> (True, (Simple, (Block, Ada_Indent)), (Simple, (Int, Ada_Indent))), T8 => (False, (Simple, (Label =>
None))), T9 => (False, (Hanging_2, (Int, Ada_Indent_Broken), (Int, Ada_Indent_Broken)))));
end case;
end package_specification_8;
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
is
pragma Unreferenced (Nonterm, Recover_Active);
T2 : constant SAL.Peek_Type := 2;
T9 : constant SAL.Peek_Type := 6;
begin
return Match_Names (Tree, Tokens, T2, T9, End_Names_Optional);
end package_specification_8_check;
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)
is
Parse_Data : Wisi.Parse_Data_Type renames Wisi.Parse_Data_Type (User_Data);
T1 : constant SAL.Peek_Type := 1;
T2 : constant SAL.Peek_Type := 2;
T4 : constant SAL.Peek_Type := 3;
T6 : constant SAL.Peek_Type := 4;
T7 : constant SAL.Peek_Type := 5;
T8 : constant SAL.Peek_Type := 6;
T9 : constant SAL.Peek_Type := 7;
begin
case Parse_Data.Post_Parse_Action is
when Navigate =>
Statement_Action (Parse_Data, Tree, Nonterm, ((T1, Statement_Start), (T4, Motion), (T6, Motion)));
Name_Action (Parse_Data, Tree, Nonterm, T2);
Motion_Action (Parse_Data, Tree, Nonterm, (Index_ID'(T1, Invalid_Token_ID) & Index_ID'(T4, Invalid_Token_ID) &
Index_ID'(T6, Invalid_Token_ID)));
when Face =>
Face_Apply_Action (Parse_Data, Tree, Nonterm, ((T2, 1, 1), (T9, 1, 1)));
when Indent =>
Indent_Action_0 (Parse_Data, Tree, Nonterm, (T1 => (False, (Simple, (Label => None))), T2 => (False,
(Hanging_2, (Int, Ada_Indent_Broken), (Int, Ada_Indent_Broken))), T4 => (False, (Simple, (Label => None))), T6
=> (False, (Simple, (Label => None))), T7 => (True, (Simple, (Block, Ada_Indent)), (Simple, (Int,
Ada_Indent))), T8 => (False, (Simple, (Label => None))), T9 => (False, (Hanging_2, (Int, Ada_Indent_Broken),
(Int, Ada_Indent_Broken)))));
end case;
end package_specification_9;
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
is
pragma Unreferenced (Nonterm, Recover_Active);
T2 : constant SAL.Peek_Type := 2;
T9 : constant SAL.Peek_Type := 7;
begin
return Match_Names (Tree, Tokens, T2, T9, End_Names_Optional);
end package_specification_9_check;
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)
is
Parse_Data : Wisi.Parse_Data_Type renames Wisi.Parse_Data_Type (User_Data);
T1 : constant SAL.Peek_Type := 1;
T2 : constant SAL.Peek_Type := 2;
T4 : constant SAL.Peek_Type := 3;
T6 : constant SAL.Peek_Type := 4;
T8 : constant SAL.Peek_Type := 5;
T9 : constant SAL.Peek_Type := 6;
begin
case Parse_Data.Post_Parse_Action is
when Navigate =>
Statement_Action (Parse_Data, Tree, Nonterm, ((T1, Statement_Start), (T4, Motion), (T6, Motion)));
Name_Action (Parse_Data, Tree, Nonterm, T2);
Motion_Action (Parse_Data, Tree, Nonterm, (Index_ID'(T1, Invalid_Token_ID) & Index_ID'(T4, Invalid_Token_ID) &
Index_ID'(T6, Invalid_Token_ID)));
when Face =>
Face_Apply_Action (Parse_Data, Tree, Nonterm, ((T2, 1, 1), (T9, 1, 1)));
when Indent =>
Indent_Action_0 (Parse_Data, Tree, Nonterm, (T1 => (False, (Simple, (Label => None))), T2 => (False,
(Hanging_2, (Int, Ada_Indent_Broken), (Int, Ada_Indent_Broken))), T4 => (False, (Simple, (Label => None))), T6
=> (False, (Simple, (Label => None))), T8 => (False, (Simple, (Label => None))), T9 => (False, (Hanging_2,
(Int, Ada_Indent_Broken), (Int, Ada_Indent_Broken)))));
end case;
end package_specification_10;
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
is
pragma Unreferenced (Nonterm, Recover_Active);
T2 : constant SAL.Peek_Type := 2;
T9 : constant SAL.Peek_Type := 6;
begin
return Match_Names (Tree, Tokens, T2, T9, End_Names_Optional);
end package_specification_10_check;
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)
is
Parse_Data : Wisi.Parse_Data_Type renames Wisi.Parse_Data_Type (User_Data);
T1 : constant SAL.Peek_Type := 1;
T2 : constant SAL.Peek_Type := 2;
T4 : constant SAL.Peek_Type := 3;
T8 : constant SAL.Peek_Type := 4;
T9 : constant SAL.Peek_Type := 5;
begin
case Parse_Data.Post_Parse_Action is
when Navigate =>
Statement_Action (Parse_Data, Tree, Nonterm, ((T1, Statement_Start), (T4, Motion)));
Name_Action (Parse_Data, Tree, Nonterm, T2);
Motion_Action (Parse_Data, Tree, Nonterm, (Index_ID'(T1, Invalid_Token_ID) & Index_ID'(T4,
Invalid_Token_ID)));
when Face =>
Face_Apply_Action (Parse_Data, Tree, Nonterm, ((T2, 1, 1), (T9, 1, 1)));
when Indent =>
Indent_Action_0 (Parse_Data, Tree, Nonterm, (T1 => (False, (Simple, (Label => None))), T2 => (False,
(Hanging_2, (Int, Ada_Indent_Broken), (Int, Ada_Indent_Broken))), T4 => (False, (Simple, (Label => None))), T8
=> (False, (Simple, (Label => None))), T9 => (False, (Hanging_2, (Int, Ada_Indent_Broken), (Int,
Ada_Indent_Broken)))));
end case;
end package_specification_11;
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
is
pragma Unreferenced (Nonterm, Recover_Active);
T2 : constant SAL.Peek_Type := 2;
T9 : constant SAL.Peek_Type := 5;
begin
return Match_Names (Tree, Tokens, T2, T9, End_Names_Optional);
end package_specification_11_check;
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)
is
Parse_Data : Wisi.Parse_Data_Type renames Wisi.Parse_Data_Type (User_Data);
T1 : constant SAL.Peek_Type := 1;
T2 : constant SAL.Peek_Type := 2;
T3 : constant SAL.Peek_Type := 3;
T4 : constant SAL.Peek_Type := 4;
T5 : constant SAL.Peek_Type := 5;
T6 : constant SAL.Peek_Type := 6;
T7 : constant SAL.Peek_Type := 7;
T8 : constant SAL.Peek_Type := 8;
T9 : constant SAL.Peek_Type := 9;
T10 : constant SAL.Peek_Type := 10;
T11 : constant SAL.Peek_Type := 11;
begin
case Parse_Data.Post_Parse_Action is
when Navigate =>
Statement_Action (Parse_Data, Tree, Nonterm, ((T1, Statement_Start), (T5, Motion), (T7, Motion), (T11,
Statement_End)));
Name_Action (Parse_Data, Tree, Nonterm, T3);
Motion_Action (Parse_Data, Tree, Nonterm, (Index_ID'(T1, Invalid_Token_ID) & Index_ID'(T5, Invalid_Token_ID) &
Index_ID'(T7, Invalid_Token_ID) & Index_ID'(T8, 63)));
when Face =>
Face_Apply_Action (Parse_Data, Tree, Nonterm, ((T3, 1, 1), (T10, 1, 1)));
when Indent =>
Indent_Action_0 (Parse_Data, Tree, Nonterm, (T1 => (False, (Simple, (Label => None))), T2 => (False, (Simple,
(Int, Ada_Indent_Broken))), T3 => (False, (Hanging_2, (Int, Ada_Indent_Broken), (Int, Ada_Indent_Broken))), T4
=> (False, (Simple, (Label => None))), T5 => (False, (Simple, (Label => None))), T6 => (True, (Simple, (Block,
Ada_Indent)), (Simple, (Int, Ada_Indent))), T7 => (False, (Simple, (Label => None))), T8 => (True, (Simple,
(Block, Ada_Indent)), (Simple, (Int, Ada_Indent))), T9 => (False, (Simple, (Label => None))), T10 => (False,
(Hanging_2, (Int, Ada_Indent_Broken), (Int, Ada_Indent_Broken))), T11 => (False, (Simple, (Int,
Ada_Indent_Broken)))));
end case;
end package_body_0;
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
is
pragma Unreferenced (Nonterm, Recover_Active);
T3 : constant SAL.Peek_Type := 3;
T10 : constant SAL.Peek_Type := 10;
begin
return Match_Names (Tree, Tokens, T3, T10, End_Names_Optional);
end package_body_0_check;
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)
is
Parse_Data : Wisi.Parse_Data_Type renames Wisi.Parse_Data_Type (User_Data);
T1 : constant SAL.Peek_Type := 1;
T2 : constant SAL.Peek_Type := 2;
T3 : constant SAL.Peek_Type := 3;
T4 : constant SAL.Peek_Type := 4;
T5 : constant SAL.Peek_Type := 5;
T6 : constant SAL.Peek_Type := 6;
T9 : constant SAL.Peek_Type := 7;
T10 : constant SAL.Peek_Type := 8;
T11 : constant SAL.Peek_Type := 9;
begin
case Parse_Data.Post_Parse_Action is
when Navigate =>
Statement_Action (Parse_Data, Tree, Nonterm, ((T1, Statement_Start), (T5, Motion), (T11, Statement_End)));
Name_Action (Parse_Data, Tree, Nonterm, T3);
Motion_Action (Parse_Data, Tree, Nonterm, (Index_ID'(T1, Invalid_Token_ID) & Index_ID'(T5,
Invalid_Token_ID)));
when Face =>
Face_Apply_Action (Parse_Data, Tree, Nonterm, ((T3, 1, 1), (T10, 1, 1)));
when Indent =>
Indent_Action_0 (Parse_Data, Tree, Nonterm, (T1 => (False, (Simple, (Label => None))), T2 => (False, (Simple,
(Int, Ada_Indent_Broken))), T3 => (False, (Hanging_2, (Int, Ada_Indent_Broken), (Int, Ada_Indent_Broken))), T4
=> (False, (Simple, (Label => None))), T5 => (False, (Simple, (Label => None))), T6 => (True, (Simple, (Block,
Ada_Indent)), (Simple, (Int, Ada_Indent))), T9 => (False, (Simple, (Label => None))), T10 => (False,
(Hanging_2, (Int, Ada_Indent_Broken), (Int, Ada_Indent_Broken))), T11 => (False, (Simple, (Int,
Ada_Indent_Broken)))));
end case;
end package_body_1;
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
is
pragma Unreferenced (Nonterm, Recover_Active);
T3 : constant SAL.Peek_Type := 3;
T10 : constant SAL.Peek_Type := 8;
begin
return Match_Names (Tree, Tokens, T3, T10, End_Names_Optional);
end package_body_1_check;
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)
is
Parse_Data : Wisi.Parse_Data_Type renames Wisi.Parse_Data_Type (User_Data);
T1 : constant SAL.Peek_Type := 1;
T2 : constant SAL.Peek_Type := 2;
T3 : constant SAL.Peek_Type := 3;
T5 : constant SAL.Peek_Type := 4;
T6 : constant SAL.Peek_Type := 5;
T7 : constant SAL.Peek_Type := 6;
T8 : constant SAL.Peek_Type := 7;
T9 : constant SAL.Peek_Type := 8;
T10 : constant SAL.Peek_Type := 9;
T11 : constant SAL.Peek_Type := 10;
begin
case Parse_Data.Post_Parse_Action is
when Navigate =>
Statement_Action (Parse_Data, Tree, Nonterm, ((T1, Statement_Start), (T5, Motion), (T7, Motion), (T11,
Statement_End)));
Name_Action (Parse_Data, Tree, Nonterm, T3);
Motion_Action (Parse_Data, Tree, Nonterm, (Index_ID'(T1, Invalid_Token_ID) & Index_ID'(T5, Invalid_Token_ID) &
Index_ID'(T7, Invalid_Token_ID) & Index_ID'(T8, 63)));
when Face =>
Face_Apply_Action (Parse_Data, Tree, Nonterm, ((T3, 1, 1), (T10, 1, 1)));
when Indent =>
Indent_Action_0 (Parse_Data, Tree, Nonterm, (T1 => (False, (Simple, (Label => None))), T2 => (False, (Simple,
(Int, Ada_Indent_Broken))), T3 => (False, (Hanging_2, (Int, Ada_Indent_Broken), (Int, Ada_Indent_Broken))), T5
=> (False, (Simple, (Label => None))), T6 => (True, (Simple, (Block, Ada_Indent)), (Simple, (Int,
Ada_Indent))), T7 => (False, (Simple, (Label => None))), T8 => (True, (Simple, (Block, Ada_Indent)), (Simple,
(Int, Ada_Indent))), T9 => (False, (Simple, (Label => None))), T10 => (False, (Hanging_2, (Int,
Ada_Indent_Broken), (Int, Ada_Indent_Broken))), T11 => (False, (Simple, (Int, Ada_Indent_Broken)))));
end case;
end package_body_2;
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
is
pragma Unreferenced (Nonterm, Recover_Active);
T3 : constant SAL.Peek_Type := 3;
T10 : constant SAL.Peek_Type := 9;
begin
return Match_Names (Tree, Tokens, T3, T10, End_Names_Optional);
end package_body_2_check;
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)
is
Parse_Data : Wisi.Parse_Data_Type renames Wisi.Parse_Data_Type (User_Data);
T1 : constant SAL.Peek_Type := 1;
T2 : constant SAL.Peek_Type := 2;
T3 : constant SAL.Peek_Type := 3;
T5 : constant SAL.Peek_Type := 4;
T6 : constant SAL.Peek_Type := 5;
T9 : constant SAL.Peek_Type := 6;
T10 : constant SAL.Peek_Type := 7;
T11 : constant SAL.Peek_Type := 8;
begin
case Parse_Data.Post_Parse_Action is
when Navigate =>
Statement_Action (Parse_Data, Tree, Nonterm, ((T1, Statement_Start), (T5, Motion), (T11, Statement_End)));
Name_Action (Parse_Data, Tree, Nonterm, T3);
Motion_Action (Parse_Data, Tree, Nonterm, (Index_ID'(T1, Invalid_Token_ID) & Index_ID'(T5,
Invalid_Token_ID)));
when Face =>
Face_Apply_Action (Parse_Data, Tree, Nonterm, ((T3, 1, 1), (T10, 1, 1)));
when Indent =>
Indent_Action_0 (Parse_Data, Tree, Nonterm, (T1 => (False, (Simple, (Label => None))), T2 => (False, (Simple,
(Int, Ada_Indent_Broken))), T3 => (False, (Hanging_2, (Int, Ada_Indent_Broken), (Int, Ada_Indent_Broken))), T5
=> (False, (Simple, (Label => None))), T6 => (True, (Simple, (Block, Ada_Indent)), (Simple, (Int,
Ada_Indent))), T9 => (False, (Simple, (Label => None))), T10 => (False, (Hanging_2, (Int, Ada_Indent_Broken),
(Int, Ada_Indent_Broken))), T11 => (False, (Simple, (Int, Ada_Indent_Broken)))));
end case;
end package_body_3;
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
is
pragma Unreferenced (Nonterm, Recover_Active);
T3 : constant SAL.Peek_Type := 3;
T10 : constant SAL.Peek_Type := 7;
begin
return Match_Names (Tree, Tokens, T3, T10, End_Names_Optional);
end package_body_3_check;
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)
is
Parse_Data : Wisi.Parse_Data_Type renames Wisi.Parse_Data_Type (User_Data);
T1 : constant SAL.Peek_Type := 1;
T2 : constant SAL.Peek_Type := 2;
T3 : constant SAL.Peek_Type := 3;
T4 : constant SAL.Peek_Type := 4;
T5 : constant SAL.Peek_Type := 5;
T6 : constant SAL.Peek_Type := 6;
T7 : constant SAL.Peek_Type := 7;
T8 : constant SAL.Peek_Type := 8;
T9 : constant SAL.Peek_Type := 9;
T10 : constant SAL.Peek_Type := 10;
begin
case Parse_Data.Post_Parse_Action is
when Navigate =>
Statement_Action (Parse_Data, Tree, Nonterm, ((T1, Statement_Start), (T10, Statement_End)));
Name_Action (Parse_Data, Tree, Nonterm, T2);
when Face =>
Face_Apply_Action (Parse_Data, Tree, Nonterm, (1 => (T2, 3, 2)));
when Indent =>
Indent_Action_0 (Parse_Data, Tree, Nonterm, (T1 => (False, (Simple, (Label => None))), T2 => (False, (Simple,
(Int, Ada_Indent_Broken))), T3 => (False, (Simple, (Int, Ada_Indent_Broken))), T4 => (False, (Simple, (Label
=> None))), T5 => (False, (Simple, (Int, Ada_Indent_Broken))), T6 => (False, (Simple, (Int,
Ada_Indent_Broken))), T7 => (False, (Simple, (Int, Ada_Indent_Broken))), T8 => (False, (Simple, (Int,
Ada_Indent_Broken))), T9 => (False, (Simple, (Label => None))), T10 => (False, (Simple, (Int,
Ada_Indent_Broken)))));
end case;
end private_type_declaration_0;
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)
is
Parse_Data : Wisi.Parse_Data_Type renames Wisi.Parse_Data_Type (User_Data);
T1 : constant SAL.Peek_Type := 1;
T2 : constant SAL.Peek_Type := 2;
T3 : constant SAL.Peek_Type := 3;
T4 : constant SAL.Peek_Type := 4;
T5 : constant SAL.Peek_Type := 5;
T6 : constant SAL.Peek_Type := 6;
T7 : constant SAL.Peek_Type := 7;
T8 : constant SAL.Peek_Type := 8;
T10 : constant SAL.Peek_Type := 9;
begin
case Parse_Data.Post_Parse_Action is
when Navigate =>
Statement_Action (Parse_Data, Tree, Nonterm, ((T1, Statement_Start), (T10, Statement_End)));
Name_Action (Parse_Data, Tree, Nonterm, T2);
when Face =>
Face_Apply_Action (Parse_Data, Tree, Nonterm, (1 => (T2, 3, 2)));
when Indent =>
Indent_Action_0 (Parse_Data, Tree, Nonterm, (T1 => (False, (Simple, (Label => None))), T2 => (False, (Simple,
(Int, Ada_Indent_Broken))), T3 => (False, (Simple, (Int, Ada_Indent_Broken))), T4 => (False, (Simple, (Label
=> None))), T5 => (False, (Simple, (Int, Ada_Indent_Broken))), T6 => (False, (Simple, (Int,
Ada_Indent_Broken))), T7 => (False, (Simple, (Int, Ada_Indent_Broken))), T8 => (False, (Simple, (Int,
Ada_Indent_Broken))), T10 => (False, (Simple, (Int, Ada_Indent_Broken)))));
end case;
end private_type_declaration_1;
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)
is
Parse_Data : Wisi.Parse_Data_Type renames Wisi.Parse_Data_Type (User_Data);
T1 : constant SAL.Peek_Type := 1;
T2 : constant SAL.Peek_Type := 2;
T3 : constant SAL.Peek_Type := 3;
T4 : constant SAL.Peek_Type := 4;
T5 : constant SAL.Peek_Type := 5;
T6 : constant SAL.Peek_Type := 6;
T8 : constant SAL.Peek_Type := 7;
T9 : constant SAL.Peek_Type := 8;
T10 : constant SAL.Peek_Type := 9;
begin
case Parse_Data.Post_Parse_Action is
when Navigate =>
Statement_Action (Parse_Data, Tree, Nonterm, ((T1, Statement_Start), (T10, Statement_End)));
Name_Action (Parse_Data, Tree, Nonterm, T2);
when Face =>
Face_Apply_Action (Parse_Data, Tree, Nonterm, (1 => (T2, 3, 2)));
when Indent =>
Indent_Action_0 (Parse_Data, Tree, Nonterm, (T1 => (False, (Simple, (Label => None))), T2 => (False, (Simple,
(Int, Ada_Indent_Broken))), T3 => (False, (Simple, (Int, Ada_Indent_Broken))), T4 => (False, (Simple, (Label
=> None))), T5 => (False, (Simple, (Int, Ada_Indent_Broken))), T6 => (False, (Simple, (Int,
Ada_Indent_Broken))), T8 => (False, (Simple, (Int, Ada_Indent_Broken))), T9 => (False, (Simple, (Label =>
None))), T10 => (False, (Simple, (Int, Ada_Indent_Broken)))));
end case;
end private_type_declaration_2;
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)
is
Parse_Data : Wisi.Parse_Data_Type renames Wisi.Parse_Data_Type (User_Data);
T1 : constant SAL.Peek_Type := 1;
T2 : constant SAL.Peek_Type := 2;
T3 : constant SAL.Peek_Type := 3;
T4 : constant SAL.Peek_Type := 4;
T5 : constant SAL.Peek_Type := 5;
T6 : constant SAL.Peek_Type := 6;
T8 : constant SAL.Peek_Type := 7;
T10 : constant SAL.Peek_Type := 8;
begin
case Parse_Data.Post_Parse_Action is
when Navigate =>
Statement_Action (Parse_Data, Tree, Nonterm, ((T1, Statement_Start), (T10, Statement_End)));
Name_Action (Parse_Data, Tree, Nonterm, T2);
when Face =>
Face_Apply_Action (Parse_Data, Tree, Nonterm, (1 => (T2, 3, 2)));
when Indent =>
Indent_Action_0 (Parse_Data, Tree, Nonterm, (T1 => (False, (Simple, (Label => None))), T2 => (False, (Simple,
(Int, Ada_Indent_Broken))), T3 => (False, (Simple, (Int, Ada_Indent_Broken))), T4 => (False, (Simple, (Label
=> None))), T5 => (False, (Simple, (Int, Ada_Indent_Broken))), T6 => (False, (Simple, (Int,
Ada_Indent_Broken))), T8 => (False, (Simple, (Int, Ada_Indent_Broken))), T10 => (False, (Simple, (Int,
Ada_Indent_Broken)))));
end case;
end private_type_declaration_3;
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)
is
Parse_Data : Wisi.Parse_Data_Type renames Wisi.Parse_Data_Type (User_Data);
T1 : constant SAL.Peek_Type := 1;
T2 : constant SAL.Peek_Type := 2;
T3 : constant SAL.Peek_Type := 3;
T4 : constant SAL.Peek_Type := 4;
T6 : constant SAL.Peek_Type := 5;
T7 : constant SAL.Peek_Type := 6;
T8 : constant SAL.Peek_Type := 7;
T9 : constant SAL.Peek_Type := 8;
T10 : constant SAL.Peek_Type := 9;
begin
case Parse_Data.Post_Parse_Action is
when Navigate =>
Statement_Action (Parse_Data, Tree, Nonterm, ((T1, Statement_Start), (T10, Statement_End)));
Name_Action (Parse_Data, Tree, Nonterm, T2);
when Face =>
Face_Apply_Action (Parse_Data, Tree, Nonterm, (1 => (T2, 3, 2)));
when Indent =>
Indent_Action_0 (Parse_Data, Tree, Nonterm, (T1 => (False, (Simple, (Label => None))), T2 => (False, (Simple,
(Int, Ada_Indent_Broken))), T3 => (False, (Simple, (Int, Ada_Indent_Broken))), T4 => (False, (Simple, (Label
=> None))), T6 => (False, (Simple, (Int, Ada_Indent_Broken))), T7 => (False, (Simple, (Int,
Ada_Indent_Broken))), T8 => (False, (Simple, (Int, Ada_Indent_Broken))), T9 => (False, (Simple, (Label =>
None))), T10 => (False, (Simple, (Int, Ada_Indent_Broken)))));
end case;
end private_type_declaration_4;
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)
is
Parse_Data : Wisi.Parse_Data_Type renames Wisi.Parse_Data_Type (User_Data);
T1 : constant SAL.Peek_Type := 1;
T2 : constant SAL.Peek_Type := 2;
T3 : constant SAL.Peek_Type := 3;
T4 : constant SAL.Peek_Type := 4;
T6 : constant SAL.Peek_Type := 5;
T7 : constant SAL.Peek_Type := 6;
T8 : constant SAL.Peek_Type := 7;
T10 : constant SAL.Peek_Type := 8;
begin
case Parse_Data.Post_Parse_Action is
when Navigate =>
Statement_Action (Parse_Data, Tree, Nonterm, ((T1, Statement_Start), (T10, Statement_End)));
Name_Action (Parse_Data, Tree, Nonterm, T2);
when Face =>
Face_Apply_Action (Parse_Data, Tree, Nonterm, (1 => (T2, 3, 2)));
when Indent =>
Indent_Action_0 (Parse_Data, Tree, Nonterm, (T1 => (False, (Simple, (Label => None))), T2 => (False, (Simple,
(Int, Ada_Indent_Broken))), T3 => (False, (Simple, (Int, Ada_Indent_Broken))), T4 => (False, (Simple, (Label
=> None))), T6 => (False, (Simple, (Int, Ada_Indent_Broken))), T7 => (False, (Simple, (Int,
Ada_Indent_Broken))), T8 => (False, (Simple, (Int, Ada_Indent_Broken))), T10 => (False, (Simple, (Int,
Ada_Indent_Broken)))));
end case;
end private_type_declaration_5;
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)
is
Parse_Data : Wisi.Parse_Data_Type renames Wisi.Parse_Data_Type (User_Data);
T1 : constant SAL.Peek_Type := 1;
T2 : constant SAL.Peek_Type := 2;
T3 : constant SAL.Peek_Type := 3;
T4 : constant SAL.Peek_Type := 4;
T6 : constant SAL.Peek_Type := 5;
T8 : constant SAL.Peek_Type := 6;
T9 : constant SAL.Peek_Type := 7;
T10 : constant SAL.Peek_Type := 8;
begin
case Parse_Data.Post_Parse_Action is
when Navigate =>
Statement_Action (Parse_Data, Tree, Nonterm, ((T1, Statement_Start), (T10, Statement_End)));
Name_Action (Parse_Data, Tree, Nonterm, T2);
when Face =>
Face_Apply_Action (Parse_Data, Tree, Nonterm, (1 => (T2, 3, 2)));
when Indent =>
Indent_Action_0 (Parse_Data, Tree, Nonterm, (T1 => (False, (Simple, (Label => None))), T2 => (False, (Simple,
(Int, Ada_Indent_Broken))), T3 => (False, (Simple, (Int, Ada_Indent_Broken))), T4 => (False, (Simple, (Label
=> None))), T6 => (False, (Simple, (Int, Ada_Indent_Broken))), T8 => (False, (Simple, (Int,
Ada_Indent_Broken))), T9 => (False, (Simple, (Label => None))), T10 => (False, (Simple, (Int,
Ada_Indent_Broken)))));
end case;
end private_type_declaration_6;
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)
is
Parse_Data : Wisi.Parse_Data_Type renames Wisi.Parse_Data_Type (User_Data);
T1 : constant SAL.Peek_Type := 1;
T2 : constant SAL.Peek_Type := 2;
T3 : constant SAL.Peek_Type := 3;
T4 : constant SAL.Peek_Type := 4;
T6 : constant SAL.Peek_Type := 5;
T8 : constant SAL.Peek_Type := 6;
T10 : constant SAL.Peek_Type := 7;
begin
case Parse_Data.Post_Parse_Action is
when Navigate =>
Statement_Action (Parse_Data, Tree, Nonterm, ((T1, Statement_Start), (T10, Statement_End)));
Name_Action (Parse_Data, Tree, Nonterm, T2);
when Face =>
Face_Apply_Action (Parse_Data, Tree, Nonterm, (1 => (T2, 3, 2)));
when Indent =>
Indent_Action_0 (Parse_Data, Tree, Nonterm, (T1 => (False, (Simple, (Label => None))), T2 => (False, (Simple,
(Int, Ada_Indent_Broken))), T3 => (False, (Simple, (Int, Ada_Indent_Broken))), T4 => (False, (Simple, (Label
=> None))), T6 => (False, (Simple, (Int, Ada_Indent_Broken))), T8 => (False, (Simple, (Int,
Ada_Indent_Broken))), T10 => (False, (Simple, (Int, Ada_Indent_Broken)))));
end case;
end private_type_declaration_7;
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)
is
Parse_Data : Wisi.Parse_Data_Type renames Wisi.Parse_Data_Type (User_Data);
T1 : constant SAL.Peek_Type := 1;
T2 : constant SAL.Peek_Type := 2;
T3 : constant SAL.Peek_Type := 3;
T4 : constant SAL.Peek_Type := 4;
T7 : constant SAL.Peek_Type := 5;
T8 : constant SAL.Peek_Type := 6;
T9 : constant SAL.Peek_Type := 7;
T10 : constant SAL.Peek_Type := 8;
begin
case Parse_Data.Post_Parse_Action is
when Navigate =>
Statement_Action (Parse_Data, Tree, Nonterm, ((T1, Statement_Start), (T10, Statement_End)));
Name_Action (Parse_Data, Tree, Nonterm, T2);
when Face =>
Face_Apply_Action (Parse_Data, Tree, Nonterm, (1 => (T2, 3, 2)));
when Indent =>
Indent_Action_0 (Parse_Data, Tree, Nonterm, (T1 => (False, (Simple, (Label => None))), T2 => (False, (Simple,
(Int, Ada_Indent_Broken))), T3 => (False, (Simple, (Int, Ada_Indent_Broken))), T4 => (False, (Simple, (Label
=> None))), T7 => (False, (Simple, (Int, Ada_Indent_Broken))), T8 => (False, (Simple, (Int,
Ada_Indent_Broken))), T9 => (False, (Simple, (Label => None))), T10 => (False, (Simple, (Int,
Ada_Indent_Broken)))));
end case;
end private_type_declaration_8;
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)
is
Parse_Data : Wisi.Parse_Data_Type renames Wisi.Parse_Data_Type (User_Data);
T1 : constant SAL.Peek_Type := 1;
T2 : constant SAL.Peek_Type := 2;
T3 : constant SAL.Peek_Type := 3;
T4 : constant SAL.Peek_Type := 4;
T7 : constant SAL.Peek_Type := 5;
T8 : constant SAL.Peek_Type := 6;
T10 : constant SAL.Peek_Type := 7;
begin
case Parse_Data.Post_Parse_Action is
when Navigate =>
Statement_Action (Parse_Data, Tree, Nonterm, ((T1, Statement_Start), (T10, Statement_End)));
Name_Action (Parse_Data, Tree, Nonterm, T2);
when Face =>
Face_Apply_Action (Parse_Data, Tree, Nonterm, (1 => (T2, 3, 2)));
when Indent =>
Indent_Action_0 (Parse_Data, Tree, Nonterm, (T1 => (False, (Simple, (Label => None))), T2 => (False, (Simple,
(Int, Ada_Indent_Broken))), T3 => (False, (Simple, (Int, Ada_Indent_Broken))), T4 => (False, (Simple, (Label
=> None))), T7 => (False, (Simple, (Int, Ada_Indent_Broken))), T8 => (False, (Simple, (Int,
Ada_Indent_Broken))), T10 => (False, (Simple, (Int, Ada_Indent_Broken)))));
end case;
end private_type_declaration_9;
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)
is
Parse_Data : Wisi.Parse_Data_Type renames Wisi.Parse_Data_Type (User_Data);
T1 : constant SAL.Peek_Type := 1;
T2 : constant SAL.Peek_Type := 2;
T3 : constant SAL.Peek_Type := 3;
T4 : constant SAL.Peek_Type := 4;
T8 : constant SAL.Peek_Type := 5;
T9 : constant SAL.Peek_Type := 6;
T10 : constant SAL.Peek_Type := 7;
begin
case Parse_Data.Post_Parse_Action is
when Navigate =>
Statement_Action (Parse_Data, Tree, Nonterm, ((T1, Statement_Start), (T10, Statement_End)));
Name_Action (Parse_Data, Tree, Nonterm, T2);
when Face =>
Face_Apply_Action (Parse_Data, Tree, Nonterm, (1 => (T2, 3, 2)));
when Indent =>
Indent_Action_0 (Parse_Data, Tree, Nonterm, (T1 => (False, (Simple, (Label => None))), T2 => (False, (Simple,
(Int, Ada_Indent_Broken))), T3 => (False, (Simple, (Int, Ada_Indent_Broken))), T4 => (False, (Simple, (Label
=> None))), T8 => (False, (Simple, (Int, Ada_Indent_Broken))), T9 => (False, (Simple, (Label => None))), T10
=> (False, (Simple, (Int, Ada_Indent_Broken)))));
end case;
end private_type_declaration_10;
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)
is
Parse_Data : Wisi.Parse_Data_Type renames Wisi.Parse_Data_Type (User_Data);
T1 : constant SAL.Peek_Type := 1;
T2 : constant SAL.Peek_Type := 2;
T3 : constant SAL.Peek_Type := 3;
T4 : constant SAL.Peek_Type := 4;
T8 : constant SAL.Peek_Type := 5;
T10 : constant SAL.Peek_Type := 6;
begin
case Parse_Data.Post_Parse_Action is
when Navigate =>
Statement_Action (Parse_Data, Tree, Nonterm, ((T1, Statement_Start), (T10, Statement_End)));
Name_Action (Parse_Data, Tree, Nonterm, T2);
when Face =>
Face_Apply_Action (Parse_Data, Tree, Nonterm, (1 => (T2, 3, 2)));
when Indent =>
Indent_Action_0 (Parse_Data, Tree, Nonterm, (T1 => (False, (Simple, (Label => None))), T2 => (False, (Simple,
(Int, Ada_Indent_Broken))), T3 => (False, (Simple, (Int, Ada_Indent_Broken))), T4 => (False, (Simple, (Label
=> None))), T8 => (False, (Simple, (Int, Ada_Indent_Broken))), T10 => (False, (Simple, (Int,
Ada_Indent_Broken)))));
end case;
end private_type_declaration_11;
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)
is
Parse_Data : Wisi.Parse_Data_Type renames Wisi.Parse_Data_Type (User_Data);
T1 : constant SAL.Peek_Type := 1;
T2 : constant SAL.Peek_Type := 2;
T4 : constant SAL.Peek_Type := 3;
T5 : constant SAL.Peek_Type := 4;
T6 : constant SAL.Peek_Type := 5;
T7 : constant SAL.Peek_Type := 6;
T8 : constant SAL.Peek_Type := 7;
T9 : constant SAL.Peek_Type := 8;
T10 : constant SAL.Peek_Type := 9;
begin
case Parse_Data.Post_Parse_Action is
when Navigate =>
Statement_Action (Parse_Data, Tree, Nonterm, ((T1, Statement_Start), (T10, Statement_End)));
Name_Action (Parse_Data, Tree, Nonterm, T2);
when Face =>
Face_Apply_Action (Parse_Data, Tree, Nonterm, (1 => (T2, 3, 2)));
when Indent =>
Indent_Action_0 (Parse_Data, Tree, Nonterm, (T1 => (False, (Simple, (Label => None))), T2 => (False, (Simple,
(Int, Ada_Indent_Broken))), T4 => (False, (Simple, (Label => None))), T5 => (False, (Simple, (Int,
Ada_Indent_Broken))), T6 => (False, (Simple, (Int, Ada_Indent_Broken))), T7 => (False, (Simple, (Int,
Ada_Indent_Broken))), T8 => (False, (Simple, (Int, Ada_Indent_Broken))), T9 => (False, (Simple, (Label =>
None))), T10 => (False, (Simple, (Int, Ada_Indent_Broken)))));
end case;
end private_type_declaration_12;
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)
is
Parse_Data : Wisi.Parse_Data_Type renames Wisi.Parse_Data_Type (User_Data);
T1 : constant SAL.Peek_Type := 1;
T2 : constant SAL.Peek_Type := 2;
T4 : constant SAL.Peek_Type := 3;
T5 : constant SAL.Peek_Type := 4;
T6 : constant SAL.Peek_Type := 5;
T7 : constant SAL.Peek_Type := 6;
T8 : constant SAL.Peek_Type := 7;
T10 : constant SAL.Peek_Type := 8;
begin
case Parse_Data.Post_Parse_Action is
when Navigate =>
Statement_Action (Parse_Data, Tree, Nonterm, ((T1, Statement_Start), (T10, Statement_End)));
Name_Action (Parse_Data, Tree, Nonterm, T2);
when Face =>
Face_Apply_Action (Parse_Data, Tree, Nonterm, (1 => (T2, 3, 2)));
when Indent =>
Indent_Action_0 (Parse_Data, Tree, Nonterm, (T1 => (False, (Simple, (Label => None))), T2 => (False, (Simple,
(Int, Ada_Indent_Broken))), T4 => (False, (Simple, (Label => None))), T5 => (False, (Simple, (Int,
Ada_Indent_Broken))), T6 => (False, (Simple, (Int, Ada_Indent_Broken))), T7 => (False, (Simple, (Int,
Ada_Indent_Broken))), T8 => (False, (Simple, (Int, Ada_Indent_Broken))), T10 => (False, (Simple, (Int,
Ada_Indent_Broken)))));
end case;
end private_type_declaration_13;
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)
is
Parse_Data : Wisi.Parse_Data_Type renames Wisi.Parse_Data_Type (User_Data);
T1 : constant SAL.Peek_Type := 1;
T2 : constant SAL.Peek_Type := 2;
T4 : constant SAL.Peek_Type := 3;
T5 : constant SAL.Peek_Type := 4;
T6 : constant SAL.Peek_Type := 5;
T8 : constant SAL.Peek_Type := 6;
T9 : constant SAL.Peek_Type := 7;
T10 : constant SAL.Peek_Type := 8;
begin
case Parse_Data.Post_Parse_Action is
when Navigate =>
Statement_Action (Parse_Data, Tree, Nonterm, ((T1, Statement_Start), (T10, Statement_End)));
Name_Action (Parse_Data, Tree, Nonterm, T2);
when Face =>
Face_Apply_Action (Parse_Data, Tree, Nonterm, (1 => (T2, 3, 2)));
when Indent =>
Indent_Action_0 (Parse_Data, Tree, Nonterm, (T1 => (False, (Simple, (Label => None))), T2 => (False, (Simple,
(Int, Ada_Indent_Broken))), T4 => (False, (Simple, (Label => None))), T5 => (False, (Simple, (Int,
Ada_Indent_Broken))), T6 => (False, (Simple, (Int, Ada_Indent_Broken))), T8 => (False, (Simple, (Int,
Ada_Indent_Broken))), T9 => (False, (Simple, (Label => None))), T10 => (False, (Simple, (Int,
Ada_Indent_Broken)))));
end case;
end private_type_declaration_14;
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)
is
Parse_Data : Wisi.Parse_Data_Type renames Wisi.Parse_Data_Type (User_Data);
T1 : constant SAL.Peek_Type := 1;
T2 : constant SAL.Peek_Type := 2;
T4 : constant SAL.Peek_Type := 3;
T5 : constant SAL.Peek_Type := 4;
T6 : constant SAL.Peek_Type := 5;
T8 : constant SAL.Peek_Type := 6;
T10 : constant SAL.Peek_Type := 7;
begin
case Parse_Data.Post_Parse_Action is
when Navigate =>
Statement_Action (Parse_Data, Tree, Nonterm, ((T1, Statement_Start), (T10, Statement_End)));
Name_Action (Parse_Data, Tree, Nonterm, T2);
when Face =>
Face_Apply_Action (Parse_Data, Tree, Nonterm, (1 => (T2, 3, 2)));
when Indent =>
Indent_Action_0 (Parse_Data, Tree, Nonterm, (T1 => (False, (Simple, (Label => None))), T2 => (False, (Simple,
(Int, Ada_Indent_Broken))), T4 => (False, (Simple, (Label => None))), T5 => (False, (Simple, (Int,
Ada_Indent_Broken))), T6 => (False, (Simple, (Int, Ada_Indent_Broken))), T8 => (False, (Simple, (Int,
Ada_Indent_Broken))), T10 => (False, (Simple, (Int, Ada_Indent_Broken)))));
end case;
end private_type_declaration_15;
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)
is
Parse_Data : Wisi.Parse_Data_Type renames Wisi.Parse_Data_Type (User_Data);
T1 : constant SAL.Peek_Type := 1;
T2 : constant SAL.Peek_Type := 2;
T4 : constant SAL.Peek_Type := 3;
T6 : constant SAL.Peek_Type := 4;
T7 : constant SAL.Peek_Type := 5;
T8 : constant SAL.Peek_Type := 6;
T9 : constant SAL.Peek_Type := 7;
T10 : constant SAL.Peek_Type := 8;
begin
case Parse_Data.Post_Parse_Action is
when Navigate =>
Statement_Action (Parse_Data, Tree, Nonterm, ((T1, Statement_Start), (T10, Statement_End)));
Name_Action (Parse_Data, Tree, Nonterm, T2);
when Face =>
Face_Apply_Action (Parse_Data, Tree, Nonterm, (1 => (T2, 3, 2)));
when Indent =>
Indent_Action_0 (Parse_Data, Tree, Nonterm, (T1 => (False, (Simple, (Label => None))), T2 => (False, (Simple,
(Int, Ada_Indent_Broken))), T4 => (False, (Simple, (Label => None))), T6 => (False, (Simple, (Int,
Ada_Indent_Broken))), T7 => (False, (Simple, (Int, Ada_Indent_Broken))), T8 => (False, (Simple, (Int,
Ada_Indent_Broken))), T9 => (False, (Simple, (Label => None))), T10 => (False, (Simple, (Int,
Ada_Indent_Broken)))));
end case;
end private_type_declaration_16;
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)
is
Parse_Data : Wisi.Parse_Data_Type renames Wisi.Parse_Data_Type (User_Data);
T1 : constant SAL.Peek_Type := 1;
T2 : constant SAL.Peek_Type := 2;
T4 : constant SAL.Peek_Type := 3;
T6 : constant SAL.Peek_Type := 4;
T7 : constant SAL.Peek_Type := 5;
T8 : constant SAL.Peek_Type := 6;
T10 : constant SAL.Peek_Type := 7;
begin
case Parse_Data.Post_Parse_Action is
when Navigate =>
Statement_Action (Parse_Data, Tree, Nonterm, ((T1, Statement_Start), (T10, Statement_End)));
Name_Action (Parse_Data, Tree, Nonterm, T2);
when Face =>
Face_Apply_Action (Parse_Data, Tree, Nonterm, (1 => (T2, 3, 2)));
when Indent =>
Indent_Action_0 (Parse_Data, Tree, Nonterm, (T1 => (False, (Simple, (Label => None))), T2 => (False, (Simple,
(Int, Ada_Indent_Broken))), T4 => (False, (Simple, (Label => None))), T6 => (False, (Simple, (Int,
Ada_Indent_Broken))), T7 => (False, (Simple, (Int, Ada_Indent_Broken))), T8 => (False, (Simple, (Int,
Ada_Indent_Broken))), T10 => (False, (Simple, (Int, Ada_Indent_Broken)))));
end case;
end private_type_declaration_17;
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)
is
Parse_Data : Wisi.Parse_Data_Type renames Wisi.Parse_Data_Type (User_Data);
T1 : constant SAL.Peek_Type := 1;
T2 : constant SAL.Peek_Type := 2;
T4 : constant SAL.Peek_Type := 3;
T6 : constant SAL.Peek_Type := 4;
T8 : constant SAL.Peek_Type := 5;
T9 : constant SAL.Peek_Type := 6;
T10 : constant SAL.Peek_Type := 7;
begin
case Parse_Data.Post_Parse_Action is
when Navigate =>
Statement_Action (Parse_Data, Tree, Nonterm, ((T1, Statement_Start), (T10, Statement_End)));
Name_Action (Parse_Data, Tree, Nonterm, T2);
when Face =>
Face_Apply_Action (Parse_Data, Tree, Nonterm, (1 => (T2, 3, 2)));
when Indent =>
Indent_Action_0 (Parse_Data, Tree, Nonterm, (T1 => (False, (Simple, (Label => None))), T2 => (False, (Simple,
(Int, Ada_Indent_Broken))), T4 => (False, (Simple, (Label => None))), T6 => (False, (Simple, (Int,
Ada_Indent_Broken))), T8 => (False, (Simple, (Int, Ada_Indent_Broken))), T9 => (False, (Simple, (Label =>
None))), T10 => (False, (Simple, (Int, Ada_Indent_Broken)))));
end case;
end private_type_declaration_18;
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)
is
Parse_Data : Wisi.Parse_Data_Type renames Wisi.Parse_Data_Type (User_Data);
T1 : constant SAL.Peek_Type := 1;
T2 : constant SAL.Peek_Type := 2;
T4 : constant SAL.Peek_Type := 3;
T6 : constant SAL.Peek_Type := 4;
T8 : constant SAL.Peek_Type := 5;
T10 : constant SAL.Peek_Type := 6;
begin
case Parse_Data.Post_Parse_Action is
when Navigate =>
Statement_Action (Parse_Data, Tree, Nonterm, ((T1, Statement_Start), (T10, Statement_End)));
Name_Action (Parse_Data, Tree, Nonterm, T2);
when Face =>
Face_Apply_Action (Parse_Data, Tree, Nonterm, (1 => (T2, 3, 2)));
when Indent =>
Indent_Action_0 (Parse_Data, Tree, Nonterm, (T1 => (False, (Simple, (Label => None))), T2 => (False, (Simple,
(Int, Ada_Indent_Broken))), T4 => (False, (Simple, (Label => None))), T6 => (False, (Simple, (Int,
Ada_Indent_Broken))), T8 => (False, (Simple, (Int, Ada_Indent_Broken))), T10 => (False, (Simple, (Int,
Ada_Indent_Broken)))));
end case;
end private_type_declaration_19;
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)
is
Parse_Data : Wisi.Parse_Data_Type renames Wisi.Parse_Data_Type (User_Data);
T1 : constant SAL.Peek_Type := 1;
T2 : constant SAL.Peek_Type := 2;
T4 : constant SAL.Peek_Type := 3;
T7 : constant SAL.Peek_Type := 4;
T8 : constant SAL.Peek_Type := 5;
T9 : constant SAL.Peek_Type := 6;
T10 : constant SAL.Peek_Type := 7;
begin
case Parse_Data.Post_Parse_Action is
when Navigate =>
Statement_Action (Parse_Data, Tree, Nonterm, ((T1, Statement_Start), (T10, Statement_End)));
Name_Action (Parse_Data, Tree, Nonterm, T2);
when Face =>
Face_Apply_Action (Parse_Data, Tree, Nonterm, (1 => (T2, 3, 2)));
when Indent =>
Indent_Action_0 (Parse_Data, Tree, Nonterm, (T1 => (False, (Simple, (Label => None))), T2 => (False, (Simple,
(Int, Ada_Indent_Broken))), T4 => (False, (Simple, (Label => None))), T7 => (False, (Simple, (Int,
Ada_Indent_Broken))), T8 => (False, (Simple, (Int, Ada_Indent_Broken))), T9 => (False, (Simple, (Label =>
None))), T10 => (False, (Simple, (Int, Ada_Indent_Broken)))));
end case;
end private_type_declaration_20;
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)
is
Parse_Data : Wisi.Parse_Data_Type renames Wisi.Parse_Data_Type (User_Data);
T1 : constant SAL.Peek_Type := 1;
T2 : constant SAL.Peek_Type := 2;
T4 : constant SAL.Peek_Type := 3;
T7 : constant SAL.Peek_Type := 4;
T8 : constant SAL.Peek_Type := 5;
T10 : constant SAL.Peek_Type := 6;
begin
case Parse_Data.Post_Parse_Action is
when Navigate =>
Statement_Action (Parse_Data, Tree, Nonterm, ((T1, Statement_Start), (T10, Statement_End)));
Name_Action (Parse_Data, Tree, Nonterm, T2);
when Face =>
Face_Apply_Action (Parse_Data, Tree, Nonterm, (1 => (T2, 3, 2)));
when Indent =>
Indent_Action_0 (Parse_Data, Tree, Nonterm, (T1 => (False, (Simple, (Label => None))), T2 => (False, (Simple,
(Int, Ada_Indent_Broken))), T4 => (False, (Simple, (Label => None))), T7 => (False, (Simple, (Int,
Ada_Indent_Broken))), T8 => (False, (Simple, (Int, Ada_Indent_Broken))), T10 => (False, (Simple, (Int,
Ada_Indent_Broken)))));
end case;
end private_type_declaration_21;
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)
is
Parse_Data : Wisi.Parse_Data_Type renames Wisi.Parse_Data_Type (User_Data);
T1 : constant SAL.Peek_Type := 1;
T2 : constant SAL.Peek_Type := 2;
T4 : constant SAL.Peek_Type := 3;
T8 : constant SAL.Peek_Type := 4;
T9 : constant SAL.Peek_Type := 5;
T10 : constant SAL.Peek_Type := 6;
begin
case Parse_Data.Post_Parse_Action is
when Navigate =>
Statement_Action (Parse_Data, Tree, Nonterm, ((T1, Statement_Start), (T10, Statement_End)));
Name_Action (Parse_Data, Tree, Nonterm, T2);
when Face =>
Face_Apply_Action (Parse_Data, Tree, Nonterm, (1 => (T2, 3, 2)));
when Indent =>
Indent_Action_0 (Parse_Data, Tree, Nonterm, (T1 => (False, (Simple, (Label => None))), T2 => (False, (Simple,
(Int, Ada_Indent_Broken))), T4 => (False, (Simple, (Label => None))), T8 => (False, (Simple, (Int,
Ada_Indent_Broken))), T9 => (False, (Simple, (Label => None))), T10 => (False, (Simple, (Int,
Ada_Indent_Broken)))));
end case;
end private_type_declaration_22;
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)
is
Parse_Data : Wisi.Parse_Data_Type renames Wisi.Parse_Data_Type (User_Data);
T1 : constant SAL.Peek_Type := 1;
T2 : constant SAL.Peek_Type := 2;
T4 : constant SAL.Peek_Type := 3;
T8 : constant SAL.Peek_Type := 4;
T10 : constant SAL.Peek_Type := 5;
begin
case Parse_Data.Post_Parse_Action is
when Navigate =>
Statement_Action (Parse_Data, Tree, Nonterm, ((T1, Statement_Start), (T10, Statement_End)));
Name_Action (Parse_Data, Tree, Nonterm, T2);
when Face =>
Face_Apply_Action (Parse_Data, Tree, Nonterm, (1 => (T2, 3, 2)));
when Indent =>
Indent_Action_0 (Parse_Data, Tree, Nonterm, (T1 => (False, (Simple, (Label => None))), T2 => (False, (Simple,
(Int, Ada_Indent_Broken))), T4 => (False, (Simple, (Label => None))), T8 => (False, (Simple, (Int,
Ada_Indent_Broken))), T10 => (False, (Simple, (Int, Ada_Indent_Broken)))));
end case;
end private_type_declaration_23;
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)
is
Parse_Data : Wisi.Parse_Data_Type renames Wisi.Parse_Data_Type (User_Data);
T1 : constant SAL.Peek_Type := 1;
T2 : constant SAL.Peek_Type := 2;
T3 : constant SAL.Peek_Type := 3;
T4 : constant SAL.Peek_Type := 4;
T5 : constant SAL.Peek_Type := 5;
T6 : constant SAL.Peek_Type := 6;
T8 : constant SAL.Peek_Type := 7;
T9 : constant SAL.Peek_Type := 8;
T10 : constant SAL.Peek_Type := 9;
T11 : constant SAL.Peek_Type := 10;
T12 : constant SAL.Peek_Type := 11;
T13 : constant SAL.Peek_Type := 12;
T14 : constant SAL.Peek_Type := 13;
T15 : constant SAL.Peek_Type := 14;
begin
case Parse_Data.Post_Parse_Action is
when Navigate =>
Statement_Action (Parse_Data, Tree, Nonterm, ((T1, Statement_Start), (T15, Statement_End)));
Name_Action (Parse_Data, Tree, Nonterm, T2);
when Face =>
Face_Apply_Action (Parse_Data, Tree, Nonterm, (1 => (T2, 3, 2)));
when Indent =>
Indent_Action_0 (Parse_Data, Tree, Nonterm, (T1 => (False, (Simple, (Label => None))), T2 => (False, (Simple,
(Int, Ada_Indent_Broken))), T3 => (False, (Simple, (Int, Ada_Indent_Broken))), T4 => (False, (Simple, (Int,
Ada_Indent_Broken))), T5 => (False, (Simple, (Int, Ada_Indent_Broken))), T6 => (False, (Simple, (Int,
Ada_Indent_Broken))), T8 => (False, (Simple, (Int, Ada_Indent_Broken))), T9 => (False, (Simple, (Int,
Ada_Indent_Broken))), T10 => (False, (Simple, (Int, Ada_Indent_Broken))), T11 => (False, (Simple, (Int,
Ada_Indent_Broken))), T12 => (False, (Simple, (Int, Ada_Indent_Broken))), T13 => (False, (Simple, (Int,
Ada_Indent_Broken))), T14 => (False, (Simple, (Label => None))), T15 => (False, (Simple, (Int,
Ada_Indent_Broken)))));
end case;
end private_extension_declaration_0;
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)
is
Parse_Data : Wisi.Parse_Data_Type renames Wisi.Parse_Data_Type (User_Data);
T1 : constant SAL.Peek_Type := 1;
T2 : constant SAL.Peek_Type := 2;
T3 : constant SAL.Peek_Type := 3;
T4 : constant SAL.Peek_Type := 4;
T5 : constant SAL.Peek_Type := 5;
T6 : constant SAL.Peek_Type := 6;
T8 : constant SAL.Peek_Type := 7;
T9 : constant SAL.Peek_Type := 8;
T10 : constant SAL.Peek_Type := 9;
T11 : constant SAL.Peek_Type := 10;
T12 : constant SAL.Peek_Type := 11;
T13 : constant SAL.Peek_Type := 12;
T15 : constant SAL.Peek_Type := 13;
begin
case Parse_Data.Post_Parse_Action is
when Navigate =>
Statement_Action (Parse_Data, Tree, Nonterm, ((T1, Statement_Start), (T15, Statement_End)));
Name_Action (Parse_Data, Tree, Nonterm, T2);
when Face =>
Face_Apply_Action (Parse_Data, Tree, Nonterm, (1 => (T2, 3, 2)));
when Indent =>
Indent_Action_0 (Parse_Data, Tree, Nonterm, (T1 => (False, (Simple, (Label => None))), T2 => (False, (Simple,
(Int, Ada_Indent_Broken))), T3 => (False, (Simple, (Int, Ada_Indent_Broken))), T4 => (False, (Simple, (Int,
Ada_Indent_Broken))), T5 => (False, (Simple, (Int, Ada_Indent_Broken))), T6 => (False, (Simple, (Int,
Ada_Indent_Broken))), T8 => (False, (Simple, (Int, Ada_Indent_Broken))), T9 => (False, (Simple, (Int,
Ada_Indent_Broken))), T10 => (False, (Simple, (Int, Ada_Indent_Broken))), T11 => (False, (Simple, (Int,
Ada_Indent_Broken))), T12 => (False, (Simple, (Int, Ada_Indent_Broken))), T13 => (False, (Simple, (Int,
Ada_Indent_Broken))), T15 => (False, (Simple, (Int, Ada_Indent_Broken)))));
end case;
end private_extension_declaration_1;
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)
is
Parse_Data : Wisi.Parse_Data_Type renames Wisi.Parse_Data_Type (User_Data);
T1 : constant SAL.Peek_Type := 1;
T2 : constant SAL.Peek_Type := 2;
T3 : constant SAL.Peek_Type := 3;
T4 : constant SAL.Peek_Type := 4;
T5 : constant SAL.Peek_Type := 5;
T6 : constant SAL.Peek_Type := 6;
T8 : constant SAL.Peek_Type := 7;
T9 : constant SAL.Peek_Type := 8;
T12 : constant SAL.Peek_Type := 9;
T13 : constant SAL.Peek_Type := 10;
T14 : constant SAL.Peek_Type := 11;
T15 : constant SAL.Peek_Type := 12;
begin
case Parse_Data.Post_Parse_Action is
when Navigate =>
Statement_Action (Parse_Data, Tree, Nonterm, ((T1, Statement_Start), (T15, Statement_End)));
Name_Action (Parse_Data, Tree, Nonterm, T2);
when Face =>
Face_Apply_Action (Parse_Data, Tree, Nonterm, (1 => (T2, 3, 2)));
when Indent =>
Indent_Action_0 (Parse_Data, Tree, Nonterm, (T1 => (False, (Simple, (Label => None))), T2 => (False, (Simple,
(Int, Ada_Indent_Broken))), T3 => (False, (Simple, (Int, Ada_Indent_Broken))), T4 => (False, (Simple, (Int,
Ada_Indent_Broken))), T5 => (False, (Simple, (Int, Ada_Indent_Broken))), T6 => (False, (Simple, (Int,
Ada_Indent_Broken))), T8 => (False, (Simple, (Int, Ada_Indent_Broken))), T9 => (False, (Simple, (Int,
Ada_Indent_Broken))), T12 => (False, (Simple, (Int, Ada_Indent_Broken))), T13 => (False, (Simple, (Int,
Ada_Indent_Broken))), T14 => (False, (Simple, (Label => None))), T15 => (False, (Simple, (Int,
Ada_Indent_Broken)))));
end case;
end private_extension_declaration_2;
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)
is
Parse_Data : Wisi.Parse_Data_Type renames Wisi.Parse_Data_Type (User_Data);
T1 : constant SAL.Peek_Type := 1;
T2 : constant SAL.Peek_Type := 2;
T3 : constant SAL.Peek_Type := 3;
T4 : constant SAL.Peek_Type := 4;
T5 : constant SAL.Peek_Type := 5;
T6 : constant SAL.Peek_Type := 6;
T8 : constant SAL.Peek_Type := 7;
T9 : constant SAL.Peek_Type := 8;
T12 : constant SAL.Peek_Type := 9;
T13 : constant SAL.Peek_Type := 10;
T15 : constant SAL.Peek_Type := 11;
begin
case Parse_Data.Post_Parse_Action is
when Navigate =>
Statement_Action (Parse_Data, Tree, Nonterm, ((T1, Statement_Start), (T15, Statement_End)));
Name_Action (Parse_Data, Tree, Nonterm, T2);
when Face =>
Face_Apply_Action (Parse_Data, Tree, Nonterm, (1 => (T2, 3, 2)));
when Indent =>
Indent_Action_0 (Parse_Data, Tree, Nonterm, (T1 => (False, (Simple, (Label => None))), T2 => (False, (Simple,
(Int, Ada_Indent_Broken))), T3 => (False, (Simple, (Int, Ada_Indent_Broken))), T4 => (False, (Simple, (Int,
Ada_Indent_Broken))), T5 => (False, (Simple, (Int, Ada_Indent_Broken))), T6 => (False, (Simple, (Int,
Ada_Indent_Broken))), T8 => (False, (Simple, (Int, Ada_Indent_Broken))), T9 => (False, (Simple, (Int,
Ada_Indent_Broken))), T12 => (False, (Simple, (Int, Ada_Indent_Broken))), T13 => (False, (Simple, (Int,
Ada_Indent_Broken))), T15 => (False, (Simple, (Int, Ada_Indent_Broken)))));
end case;
end private_extension_declaration_3;
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)
is
Parse_Data : Wisi.Parse_Data_Type renames Wisi.Parse_Data_Type (User_Data);
T1 : constant SAL.Peek_Type := 1;
T2 : constant SAL.Peek_Type := 2;
T3 : constant SAL.Peek_Type := 3;
T4 : constant SAL.Peek_Type := 4;
T5 : constant SAL.Peek_Type := 5;
T8 : constant SAL.Peek_Type := 7;
T9 : constant SAL.Peek_Type := 8;
T10 : constant SAL.Peek_Type := 9;
T11 : constant SAL.Peek_Type := 10;
T12 : constant SAL.Peek_Type := 11;
T13 : constant SAL.Peek_Type := 12;
T14 : constant SAL.Peek_Type := 13;
T15 : constant SAL.Peek_Type := 14;
T7 : constant SAL.Peek_Type := 6;
begin
case Parse_Data.Post_Parse_Action is
when Navigate =>
Statement_Action (Parse_Data, Tree, Nonterm, ((T1, Statement_Start), (T15, Statement_End)));
Name_Action (Parse_Data, Tree, Nonterm, T2);
when Face =>
Face_Apply_Action (Parse_Data, Tree, Nonterm, (1 => (T2, 3, 2)));
when Indent =>
Indent_Action_0 (Parse_Data, Tree, Nonterm, (T1 => (False, (Simple, (Label => None))), T2 => (False, (Simple,
(Int, Ada_Indent_Broken))), T3 => (False, (Simple, (Int, Ada_Indent_Broken))), T4 => (False, (Simple, (Int,
Ada_Indent_Broken))), T5 => (False, (Simple, (Int, Ada_Indent_Broken))), T7 => (False, (Simple, (Int,
Ada_Indent_Broken))), T8 => (False, (Simple, (Int, Ada_Indent_Broken))), T9 => (False, (Simple, (Int,
Ada_Indent_Broken))), T10 => (False, (Simple, (Int, Ada_Indent_Broken))), T11 => (False, (Simple, (Int,
Ada_Indent_Broken))), T12 => (False, (Simple, (Int, Ada_Indent_Broken))), T13 => (False, (Simple, (Int,
Ada_Indent_Broken))), T14 => (False, (Simple, (Label => None))), T15 => (False, (Simple, (Int,
Ada_Indent_Broken)))));
end case;
end private_extension_declaration_4;
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)
is
Parse_Data : Wisi.Parse_Data_Type renames Wisi.Parse_Data_Type (User_Data);
T1 : constant SAL.Peek_Type := 1;
T2 : constant SAL.Peek_Type := 2;
T3 : constant SAL.Peek_Type := 3;
T4 : constant SAL.Peek_Type := 4;
T5 : constant SAL.Peek_Type := 5;
T8 : constant SAL.Peek_Type := 7;
T9 : constant SAL.Peek_Type := 8;
T10 : constant SAL.Peek_Type := 9;
T11 : constant SAL.Peek_Type := 10;
T12 : constant SAL.Peek_Type := 11;
T13 : constant SAL.Peek_Type := 12;
T15 : constant SAL.Peek_Type := 13;
T7 : constant SAL.Peek_Type := 6;
begin
case Parse_Data.Post_Parse_Action is
when Navigate =>
Statement_Action (Parse_Data, Tree, Nonterm, ((T1, Statement_Start), (T15, Statement_End)));
Name_Action (Parse_Data, Tree, Nonterm, T2);
when Face =>
Face_Apply_Action (Parse_Data, Tree, Nonterm, (1 => (T2, 3, 2)));
when Indent =>
Indent_Action_0 (Parse_Data, Tree, Nonterm, (T1 => (False, (Simple, (Label => None))), T2 => (False, (Simple,
(Int, Ada_Indent_Broken))), T3 => (False, (Simple, (Int, Ada_Indent_Broken))), T4 => (False, (Simple, (Int,
Ada_Indent_Broken))), T5 => (False, (Simple, (Int, Ada_Indent_Broken))), T7 => (False, (Simple, (Int,
Ada_Indent_Broken))), T8 => (False, (Simple, (Int, Ada_Indent_Broken))), T9 => (False, (Simple, (Int,
Ada_Indent_Broken))), T10 => (False, (Simple, (Int, Ada_Indent_Broken))), T11 => (False, (Simple, (Int,
Ada_Indent_Broken))), T12 => (False, (Simple, (Int, Ada_Indent_Broken))), T13 => (False, (Simple, (Int,
Ada_Indent_Broken))), T15 => (False, (Simple, (Int, Ada_Indent_Broken)))));
end case;
end private_extension_declaration_5;
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)
is
Parse_Data : Wisi.Parse_Data_Type renames Wisi.Parse_Data_Type (User_Data);
T1 : constant SAL.Peek_Type := 1;
T2 : constant SAL.Peek_Type := 2;
T3 : constant SAL.Peek_Type := 3;
T4 : constant SAL.Peek_Type := 4;
T5 : constant SAL.Peek_Type := 5;
T8 : constant SAL.Peek_Type := 7;
T9 : constant SAL.Peek_Type := 8;
T12 : constant SAL.Peek_Type := 9;
T13 : constant SAL.Peek_Type := 10;
T14 : constant SAL.Peek_Type := 11;
T15 : constant SAL.Peek_Type := 12;
T7 : constant SAL.Peek_Type := 6;
begin
case Parse_Data.Post_Parse_Action is
when Navigate =>
Statement_Action (Parse_Data, Tree, Nonterm, ((T1, Statement_Start), (T15, Statement_End)));
Name_Action (Parse_Data, Tree, Nonterm, T2);
when Face =>
Face_Apply_Action (Parse_Data, Tree, Nonterm, (1 => (T2, 3, 2)));
when Indent =>
Indent_Action_0 (Parse_Data, Tree, Nonterm, (T1 => (False, (Simple, (Label => None))), T2 => (False, (Simple,
(Int, Ada_Indent_Broken))), T3 => (False, (Simple, (Int, Ada_Indent_Broken))), T4 => (False, (Simple, (Int,
Ada_Indent_Broken))), T5 => (False, (Simple, (Int, Ada_Indent_Broken))), T7 => (False, (Simple, (Int,
Ada_Indent_Broken))), T8 => (False, (Simple, (Int, Ada_Indent_Broken))), T9 => (False, (Simple, (Int,
Ada_Indent_Broken))), T12 => (False, (Simple, (Int, Ada_Indent_Broken))), T13 => (False, (Simple, (Int,
Ada_Indent_Broken))), T14 => (False, (Simple, (Label => None))), T15 => (False, (Simple, (Int,
Ada_Indent_Broken)))));
end case;
end private_extension_declaration_6;
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)
is
Parse_Data : Wisi.Parse_Data_Type renames Wisi.Parse_Data_Type (User_Data);
T1 : constant SAL.Peek_Type := 1;
T2 : constant SAL.Peek_Type := 2;
T3 : constant SAL.Peek_Type := 3;
T4 : constant SAL.Peek_Type := 4;
T5 : constant SAL.Peek_Type := 5;
T8 : constant SAL.Peek_Type := 7;
T9 : constant SAL.Peek_Type := 8;
T12 : constant SAL.Peek_Type := 9;
T13 : constant SAL.Peek_Type := 10;
T15 : constant SAL.Peek_Type := 11;
T7 : constant SAL.Peek_Type := 6;
begin
case Parse_Data.Post_Parse_Action is
when Navigate =>
Statement_Action (Parse_Data, Tree, Nonterm, ((T1, Statement_Start), (T15, Statement_End)));
Name_Action (Parse_Data, Tree, Nonterm, T2);
when Face =>
Face_Apply_Action (Parse_Data, Tree, Nonterm, (1 => (T2, 3, 2)));
when Indent =>
Indent_Action_0 (Parse_Data, Tree, Nonterm, (T1 => (False, (Simple, (Label => None))), T2 => (False, (Simple,
(Int, Ada_Indent_Broken))), T3 => (False, (Simple, (Int, Ada_Indent_Broken))), T4 => (False, (Simple, (Int,
Ada_Indent_Broken))), T5 => (False, (Simple, (Int, Ada_Indent_Broken))), T7 => (False, (Simple, (Int,
Ada_Indent_Broken))), T8 => (False, (Simple, (Int, Ada_Indent_Broken))), T9 => (False, (Simple, (Int,
Ada_Indent_Broken))), T12 => (False, (Simple, (Int, Ada_Indent_Broken))), T13 => (False, (Simple, (Int,
Ada_Indent_Broken))), T15 => (False, (Simple, (Int, Ada_Indent_Broken)))));
end case;
end private_extension_declaration_7;
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)
is
Parse_Data : Wisi.Parse_Data_Type renames Wisi.Parse_Data_Type (User_Data);
T1 : constant SAL.Peek_Type := 1;
T2 : constant SAL.Peek_Type := 2;
T3 : constant SAL.Peek_Type := 3;
T4 : constant SAL.Peek_Type := 4;
T5 : constant SAL.Peek_Type := 5;
T8 : constant SAL.Peek_Type := 6;
T9 : constant SAL.Peek_Type := 7;
T10 : constant SAL.Peek_Type := 8;
T11 : constant SAL.Peek_Type := 9;
T12 : constant SAL.Peek_Type := 10;
T13 : constant SAL.Peek_Type := 11;
T14 : constant SAL.Peek_Type := 12;
T15 : constant SAL.Peek_Type := 13;
begin
case Parse_Data.Post_Parse_Action is
when Navigate =>
Statement_Action (Parse_Data, Tree, Nonterm, ((T1, Statement_Start), (T15, Statement_End)));
Name_Action (Parse_Data, Tree, Nonterm, T2);
when Face =>
Face_Apply_Action (Parse_Data, Tree, Nonterm, (1 => (T2, 3, 2)));
when Indent =>
Indent_Action_0 (Parse_Data, Tree, Nonterm, (T1 => (False, (Simple, (Label => None))), T2 => (False, (Simple,
(Int, Ada_Indent_Broken))), T3 => (False, (Simple, (Int, Ada_Indent_Broken))), T4 => (False, (Simple, (Int,
Ada_Indent_Broken))), T5 => (False, (Simple, (Int, Ada_Indent_Broken))), T8 => (False, (Simple, (Int,
Ada_Indent_Broken))), T9 => (False, (Simple, (Int, Ada_Indent_Broken))), T10 => (False, (Simple, (Int,
Ada_Indent_Broken))), T11 => (False, (Simple, (Int, Ada_Indent_Broken))), T12 => (False, (Simple, (Int,
Ada_Indent_Broken))), T13 => (False, (Simple, (Int, Ada_Indent_Broken))), T14 => (False, (Simple, (Label =>
None))), T15 => (False, (Simple, (Int, Ada_Indent_Broken)))));
end case;
end private_extension_declaration_8;
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)
is
Parse_Data : Wisi.Parse_Data_Type renames Wisi.Parse_Data_Type (User_Data);
T1 : constant SAL.Peek_Type := 1;
T2 : constant SAL.Peek_Type := 2;
T3 : constant SAL.Peek_Type := 3;
T4 : constant SAL.Peek_Type := 4;
T5 : constant SAL.Peek_Type := 5;
T8 : constant SAL.Peek_Type := 6;
T9 : constant SAL.Peek_Type := 7;
T10 : constant SAL.Peek_Type := 8;
T11 : constant SAL.Peek_Type := 9;
T12 : constant SAL.Peek_Type := 10;
T13 : constant SAL.Peek_Type := 11;
T15 : constant SAL.Peek_Type := 12;
begin
case Parse_Data.Post_Parse_Action is
when Navigate =>
Statement_Action (Parse_Data, Tree, Nonterm, ((T1, Statement_Start), (T15, Statement_End)));
Name_Action (Parse_Data, Tree, Nonterm, T2);
when Face =>
Face_Apply_Action (Parse_Data, Tree, Nonterm, (1 => (T2, 3, 2)));
when Indent =>
Indent_Action_0 (Parse_Data, Tree, Nonterm, (T1 => (False, (Simple, (Label => None))), T2 => (False, (Simple,
(Int, Ada_Indent_Broken))), T3 => (False, (Simple, (Int, Ada_Indent_Broken))), T4 => (False, (Simple, (Int,
Ada_Indent_Broken))), T5 => (False, (Simple, (Int, Ada_Indent_Broken))), T8 => (False, (Simple, (Int,
Ada_Indent_Broken))), T9 => (False, (Simple, (Int, Ada_Indent_Broken))), T10 => (False, (Simple, (Int,
Ada_Indent_Broken))), T11 => (False, (Simple, (Int, Ada_Indent_Broken))), T12 => (False, (Simple, (Int,
Ada_Indent_Broken))), T13 => (False, (Simple, (Int, Ada_Indent_Broken))), T15 => (False, (Simple, (Int,
Ada_Indent_Broken)))));
end case;
end private_extension_declaration_9;
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)
is
Parse_Data : Wisi.Parse_Data_Type renames Wisi.Parse_Data_Type (User_Data);
T1 : constant SAL.Peek_Type := 1;
T2 : constant SAL.Peek_Type := 2;
T3 : constant SAL.Peek_Type := 3;
T4 : constant SAL.Peek_Type := 4;
T5 : constant SAL.Peek_Type := 5;
T8 : constant SAL.Peek_Type := 6;
T9 : constant SAL.Peek_Type := 7;
T12 : constant SAL.Peek_Type := 8;
T13 : constant SAL.Peek_Type := 9;
T14 : constant SAL.Peek_Type := 10;
T15 : constant SAL.Peek_Type := 11;
begin
case Parse_Data.Post_Parse_Action is
when Navigate =>
Statement_Action (Parse_Data, Tree, Nonterm, ((T1, Statement_Start), (T15, Statement_End)));
Name_Action (Parse_Data, Tree, Nonterm, T2);
when Face =>
Face_Apply_Action (Parse_Data, Tree, Nonterm, (1 => (T2, 3, 2)));
when Indent =>
Indent_Action_0 (Parse_Data, Tree, Nonterm, (T1 => (False, (Simple, (Label => None))), T2 => (False, (Simple,
(Int, Ada_Indent_Broken))), T3 => (False, (Simple, (Int, Ada_Indent_Broken))), T4 => (False, (Simple, (Int,
Ada_Indent_Broken))), T5 => (False, (Simple, (Int, Ada_Indent_Broken))), T8 => (False, (Simple, (Int,
Ada_Indent_Broken))), T9 => (False, (Simple, (Int, Ada_Indent_Broken))), T12 => (False, (Simple, (Int,
Ada_Indent_Broken))), T13 => (False, (Simple, (Int, Ada_Indent_Broken))), T14 => (False, (Simple, (Label =>
None))), T15 => (False, (Simple, (Int, Ada_Indent_Broken)))));
end case;
end private_extension_declaration_10;
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)
is
Parse_Data : Wisi.Parse_Data_Type renames Wisi.Parse_Data_Type (User_Data);
T1 : constant SAL.Peek_Type := 1;
T2 : constant SAL.Peek_Type := 2;
T3 : constant SAL.Peek_Type := 3;
T4 : constant SAL.Peek_Type := 4;
T5 : constant SAL.Peek_Type := 5;
T8 : constant SAL.Peek_Type := 6;
T9 : constant SAL.Peek_Type := 7;
T12 : constant SAL.Peek_Type := 8;
T13 : constant SAL.Peek_Type := 9;
T15 : constant SAL.Peek_Type := 10;
begin
case Parse_Data.Post_Parse_Action is
when Navigate =>
Statement_Action (Parse_Data, Tree, Nonterm, ((T1, Statement_Start), (T15, Statement_End)));
Name_Action (Parse_Data, Tree, Nonterm, T2);
when Face =>
Face_Apply_Action (Parse_Data, Tree, Nonterm, (1 => (T2, 3, 2)));
when Indent =>
Indent_Action_0 (Parse_Data, Tree, Nonterm, (T1 => (False, (Simple, (Label => None))), T2 => (False, (Simple,
(Int, Ada_Indent_Broken))), T3 => (False, (Simple, (Int, Ada_Indent_Broken))), T4 => (False, (Simple, (Int,
Ada_Indent_Broken))), T5 => (False, (Simple, (Int, Ada_Indent_Broken))), T8 => (False, (Simple, (Int,
Ada_Indent_Broken))), T9 => (False, (Simple, (Int, Ada_Indent_Broken))), T12 => (False, (Simple, (Int,
Ada_Indent_Broken))), T13 => (False, (Simple, (Int, Ada_Indent_Broken))), T15 => (False, (Simple, (Int,
Ada_Indent_Broken)))));
end case;
end private_extension_declaration_11;
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)
is
Parse_Data : Wisi.Parse_Data_Type renames Wisi.Parse_Data_Type (User_Data);
T1 : constant SAL.Peek_Type := 1;
T2 : constant SAL.Peek_Type := 2;
T3 : constant SAL.Peek_Type := 3;
T4 : constant SAL.Peek_Type := 4;
T6 : constant SAL.Peek_Type := 5;
T8 : constant SAL.Peek_Type := 6;
T9 : constant SAL.Peek_Type := 7;
T10 : constant SAL.Peek_Type := 8;
T11 : constant SAL.Peek_Type := 9;
T12 : constant SAL.Peek_Type := 10;
T13 : constant SAL.Peek_Type := 11;
T14 : constant SAL.Peek_Type := 12;
T15 : constant SAL.Peek_Type := 13;
begin
case Parse_Data.Post_Parse_Action is
when Navigate =>
Statement_Action (Parse_Data, Tree, Nonterm, ((T1, Statement_Start), (T15, Statement_End)));
Name_Action (Parse_Data, Tree, Nonterm, T2);
when Face =>
Face_Apply_Action (Parse_Data, Tree, Nonterm, (1 => (T2, 3, 2)));
when Indent =>
Indent_Action_0 (Parse_Data, Tree, Nonterm, (T1 => (False, (Simple, (Label => None))), T2 => (False, (Simple,
(Int, Ada_Indent_Broken))), T3 => (False, (Simple, (Int, Ada_Indent_Broken))), T4 => (False, (Simple, (Int,
Ada_Indent_Broken))), T6 => (False, (Simple, (Int, Ada_Indent_Broken))), T8 => (False, (Simple, (Int,
Ada_Indent_Broken))), T9 => (False, (Simple, (Int, Ada_Indent_Broken))), T10 => (False, (Simple, (Int,
Ada_Indent_Broken))), T11 => (False, (Simple, (Int, Ada_Indent_Broken))), T12 => (False, (Simple, (Int,
Ada_Indent_Broken))), T13 => (False, (Simple, (Int, Ada_Indent_Broken))), T14 => (False, (Simple, (Label =>
None))), T15 => (False, (Simple, (Int, Ada_Indent_Broken)))));
end case;
end private_extension_declaration_12;
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)
is
Parse_Data : Wisi.Parse_Data_Type renames Wisi.Parse_Data_Type (User_Data);
T1 : constant SAL.Peek_Type := 1;
T2 : constant SAL.Peek_Type := 2;
T3 : constant SAL.Peek_Type := 3;
T4 : constant SAL.Peek_Type := 4;
T6 : constant SAL.Peek_Type := 5;
T8 : constant SAL.Peek_Type := 6;
T9 : constant SAL.Peek_Type := 7;
T10 : constant SAL.Peek_Type := 8;
T11 : constant SAL.Peek_Type := 9;
T12 : constant SAL.Peek_Type := 10;
T13 : constant SAL.Peek_Type := 11;
T15 : constant SAL.Peek_Type := 12;
begin
case Parse_Data.Post_Parse_Action is
when Navigate =>
Statement_Action (Parse_Data, Tree, Nonterm, ((T1, Statement_Start), (T15, Statement_End)));
Name_Action (Parse_Data, Tree, Nonterm, T2);
when Face =>
Face_Apply_Action (Parse_Data, Tree, Nonterm, (1 => (T2, 3, 2)));
when Indent =>
Indent_Action_0 (Parse_Data, Tree, Nonterm, (T1 => (False, (Simple, (Label => None))), T2 => (False, (Simple,
(Int, Ada_Indent_Broken))), T3 => (False, (Simple, (Int, Ada_Indent_Broken))), T4 => (False, (Simple, (Int,
Ada_Indent_Broken))), T6 => (False, (Simple, (Int, Ada_Indent_Broken))), T8 => (False, (Simple, (Int,
Ada_Indent_Broken))), T9 => (False, (Simple, (Int, Ada_Indent_Broken))), T10 => (False, (Simple, (Int,
Ada_Indent_Broken))), T11 => (False, (Simple, (Int, Ada_Indent_Broken))), T12 => (False, (Simple, (Int,
Ada_Indent_Broken))), T13 => (False, (Simple, (Int, Ada_Indent_Broken))), T15 => (False, (Simple, (Int,
Ada_Indent_Broken)))));
end case;
end private_extension_declaration_13;
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)
is
Parse_Data : Wisi.Parse_Data_Type renames Wisi.Parse_Data_Type (User_Data);
T1 : constant SAL.Peek_Type := 1;
T2 : constant SAL.Peek_Type := 2;
T3 : constant SAL.Peek_Type := 3;
T4 : constant SAL.Peek_Type := 4;
T6 : constant SAL.Peek_Type := 5;
T8 : constant SAL.Peek_Type := 6;
T9 : constant SAL.Peek_Type := 7;
T12 : constant SAL.Peek_Type := 8;
T13 : constant SAL.Peek_Type := 9;
T14 : constant SAL.Peek_Type := 10;
T15 : constant SAL.Peek_Type := 11;
begin
case Parse_Data.Post_Parse_Action is
when Navigate =>
Statement_Action (Parse_Data, Tree, Nonterm, ((T1, Statement_Start), (T15, Statement_End)));
Name_Action (Parse_Data, Tree, Nonterm, T2);
when Face =>
Face_Apply_Action (Parse_Data, Tree, Nonterm, (1 => (T2, 3, 2)));
when Indent =>
Indent_Action_0 (Parse_Data, Tree, Nonterm, (T1 => (False, (Simple, (Label => None))), T2 => (False, (Simple,
(Int, Ada_Indent_Broken))), T3 => (False, (Simple, (Int, Ada_Indent_Broken))), T4 => (False, (Simple, (Int,
Ada_Indent_Broken))), T6 => (False, (Simple, (Int, Ada_Indent_Broken))), T8 => (False, (Simple, (Int,
Ada_Indent_Broken))), T9 => (False, (Simple, (Int, Ada_Indent_Broken))), T12 => (False, (Simple, (Int,
Ada_Indent_Broken))), T13 => (False, (Simple, (Int, Ada_Indent_Broken))), T14 => (False, (Simple, (Label =>
None))), T15 => (False, (Simple, (Int, Ada_Indent_Broken)))));
end case;
end private_extension_declaration_14;
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)
is
Parse_Data : Wisi.Parse_Data_Type renames Wisi.Parse_Data_Type (User_Data);
T1 : constant SAL.Peek_Type := 1;
T2 : constant SAL.Peek_Type := 2;
T3 : constant SAL.Peek_Type := 3;
T4 : constant SAL.Peek_Type := 4;
T6 : constant SAL.Peek_Type := 5;
T8 : constant SAL.Peek_Type := 6;
T9 : constant SAL.Peek_Type := 7;
T12 : constant SAL.Peek_Type := 8;
T13 : constant SAL.Peek_Type := 9;
T15 : constant SAL.Peek_Type := 10;
begin
case Parse_Data.Post_Parse_Action is
when Navigate =>
Statement_Action (Parse_Data, Tree, Nonterm, ((T1, Statement_Start), (T15, Statement_End)));
Name_Action (Parse_Data, Tree, Nonterm, T2);
when Face =>
Face_Apply_Action (Parse_Data, Tree, Nonterm, (1 => (T2, 3, 2)));
when Indent =>
Indent_Action_0 (Parse_Data, Tree, Nonterm, (T1 => (False, (Simple, (Label => None))), T2 => (False, (Simple,
(Int, Ada_Indent_Broken))), T3 => (False, (Simple, (Int, Ada_Indent_Broken))), T4 => (False, (Simple, (Int,
Ada_Indent_Broken))), T6 => (False, (Simple, (Int, Ada_Indent_Broken))), T8 => (False, (Simple, (Int,
Ada_Indent_Broken))), T9 => (False, (Simple, (Int, Ada_Indent_Broken))), T12 => (False, (Simple, (Int,
Ada_Indent_Broken))), T13 => (False, (Simple, (Int, Ada_Indent_Broken))), T15 => (False, (Simple, (Int,
Ada_Indent_Broken)))));
end case;
end private_extension_declaration_15;
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)
is
Parse_Data : Wisi.Parse_Data_Type renames Wisi.Parse_Data_Type (User_Data);
T1 : constant SAL.Peek_Type := 1;
T2 : constant SAL.Peek_Type := 2;
T3 : constant SAL.Peek_Type := 3;
T4 : constant SAL.Peek_Type := 4;
T8 : constant SAL.Peek_Type := 6;
T9 : constant SAL.Peek_Type := 7;
T10 : constant SAL.Peek_Type := 8;
T11 : constant SAL.Peek_Type := 9;
T12 : constant SAL.Peek_Type := 10;
T13 : constant SAL.Peek_Type := 11;
T14 : constant SAL.Peek_Type := 12;
T15 : constant SAL.Peek_Type := 13;
T7 : constant SAL.Peek_Type := 5;
begin
case Parse_Data.Post_Parse_Action is
when Navigate =>
Statement_Action (Parse_Data, Tree, Nonterm, ((T1, Statement_Start), (T15, Statement_End)));
Name_Action (Parse_Data, Tree, Nonterm, T2);
when Face =>
Face_Apply_Action (Parse_Data, Tree, Nonterm, (1 => (T2, 3, 2)));
when Indent =>
Indent_Action_0 (Parse_Data, Tree, Nonterm, (T1 => (False, (Simple, (Label => None))), T2 => (False, (Simple,
(Int, Ada_Indent_Broken))), T3 => (False, (Simple, (Int, Ada_Indent_Broken))), T4 => (False, (Simple, (Int,
Ada_Indent_Broken))), T7 => (False, (Simple, (Int, Ada_Indent_Broken))), T8 => (False, (Simple, (Int,
Ada_Indent_Broken))), T9 => (False, (Simple, (Int, Ada_Indent_Broken))), T10 => (False, (Simple, (Int,
Ada_Indent_Broken))), T11 => (False, (Simple, (Int, Ada_Indent_Broken))), T12 => (False, (Simple, (Int,
Ada_Indent_Broken))), T13 => (False, (Simple, (Int, Ada_Indent_Broken))), T14 => (False, (Simple, (Label =>
None))), T15 => (False, (Simple, (Int, Ada_Indent_Broken)))));
end case;
end private_extension_declaration_16;
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)
is
Parse_Data : Wisi.Parse_Data_Type renames Wisi.Parse_Data_Type (User_Data);
T1 : constant SAL.Peek_Type := 1;
T2 : constant SAL.Peek_Type := 2;
T3 : constant SAL.Peek_Type := 3;
T4 : constant SAL.Peek_Type := 4;
T8 : constant SAL.Peek_Type := 6;
T9 : constant SAL.Peek_Type := 7;
T10 : constant SAL.Peek_Type := 8;
T11 : constant SAL.Peek_Type := 9;
T12 : constant SAL.Peek_Type := 10;
T13 : constant SAL.Peek_Type := 11;
T15 : constant SAL.Peek_Type := 12;
T7 : constant SAL.Peek_Type := 5;
begin
case Parse_Data.Post_Parse_Action is
when Navigate =>
Statement_Action (Parse_Data, Tree, Nonterm, ((T1, Statement_Start), (T15, Statement_End)));
Name_Action (Parse_Data, Tree, Nonterm, T2);
when Face =>
Face_Apply_Action (Parse_Data, Tree, Nonterm, (1 => (T2, 3, 2)));
when Indent =>
Indent_Action_0 (Parse_Data, Tree, Nonterm, (T1 => (False, (Simple, (Label => None))), T2 => (False, (Simple,
(Int, Ada_Indent_Broken))), T3 => (False, (Simple, (Int, Ada_Indent_Broken))), T4 => (False, (Simple, (Int,
Ada_Indent_Broken))), T7 => (False, (Simple, (Int, Ada_Indent_Broken))), T8 => (False, (Simple, (Int,
Ada_Indent_Broken))), T9 => (False, (Simple, (Int, Ada_Indent_Broken))), T10 => (False, (Simple, (Int,
Ada_Indent_Broken))), T11 => (False, (Simple, (Int, Ada_Indent_Broken))), T12 => (False, (Simple, (Int,
Ada_Indent_Broken))), T13 => (False, (Simple, (Int, Ada_Indent_Broken))), T15 => (False, (Simple, (Int,
Ada_Indent_Broken)))));
end case;
end private_extension_declaration_17;
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)
is
Parse_Data : Wisi.Parse_Data_Type renames Wisi.Parse_Data_Type (User_Data);
T1 : constant SAL.Peek_Type := 1;
T2 : constant SAL.Peek_Type := 2;
T3 : constant SAL.Peek_Type := 3;
T4 : constant SAL.Peek_Type := 4;
T8 : constant SAL.Peek_Type := 6;
T9 : constant SAL.Peek_Type := 7;
T12 : constant SAL.Peek_Type := 8;
T13 : constant SAL.Peek_Type := 9;
T14 : constant SAL.Peek_Type := 10;
T15 : constant SAL.Peek_Type := 11;
T7 : constant SAL.Peek_Type := 5;
begin
case Parse_Data.Post_Parse_Action is
when Navigate =>
Statement_Action (Parse_Data, Tree, Nonterm, ((T1, Statement_Start), (T15, Statement_End)));
Name_Action (Parse_Data, Tree, Nonterm, T2);
when Face =>
Face_Apply_Action (Parse_Data, Tree, Nonterm, (1 => (T2, 3, 2)));
when Indent =>
Indent_Action_0 (Parse_Data, Tree, Nonterm, (T1 => (False, (Simple, (Label => None))), T2 => (False, (Simple,
(Int, Ada_Indent_Broken))), T3 => (False, (Simple, (Int, Ada_Indent_Broken))), T4 => (False, (Simple, (Int,
Ada_Indent_Broken))), T7 => (False, (Simple, (Int, Ada_Indent_Broken))), T8 => (False, (Simple, (Int,
Ada_Indent_Broken))), T9 => (False, (Simple, (Int, Ada_Indent_Broken))), T12 => (False, (Simple, (Int,
Ada_Indent_Broken))), T13 => (False, (Simple, (Int, Ada_Indent_Broken))), T14 => (False, (Simple, (Label =>
None))), T15 => (False, (Simple, (Int, Ada_Indent_Broken)))));
end case;
end private_extension_declaration_18;
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)
is
Parse_Data : Wisi.Parse_Data_Type renames Wisi.Parse_Data_Type (User_Data);
T1 : constant SAL.Peek_Type := 1;
T2 : constant SAL.Peek_Type := 2;
T3 : constant SAL.Peek_Type := 3;
T4 : constant SAL.Peek_Type := 4;
T8 : constant SAL.Peek_Type := 6;
T9 : constant SAL.Peek_Type := 7;
T12 : constant SAL.Peek_Type := 8;
T13 : constant SAL.Peek_Type := 9;
T15 : constant SAL.Peek_Type := 10;
T7 : constant SAL.Peek_Type := 5;
begin
case Parse_Data.Post_Parse_Action is
when Navigate =>
Statement_Action (Parse_Data, Tree, Nonterm, ((T1, Statement_Start), (T15, Statement_End)));
Name_Action (Parse_Data, Tree, Nonterm, T2);
when Face =>
Face_Apply_Action (Parse_Data, Tree, Nonterm, (1 => (T2, 3, 2)));
when Indent =>
Indent_Action_0 (Parse_Data, Tree, Nonterm, (T1 => (False, (Simple, (Label => None))), T2 => (False, (Simple,
(Int, Ada_Indent_Broken))), T3 => (False, (Simple, (Int, Ada_Indent_Broken))), T4 => (False, (Simple, (Int,
Ada_Indent_Broken))), T7 => (False, (Simple, (Int, Ada_Indent_Broken))), T8 => (False, (Simple, (Int,
Ada_Indent_Broken))), T9 => (False, (Simple, (Int, Ada_Indent_Broken))), T12 => (False, (Simple, (Int,
Ada_Indent_Broken))), T13 => (False, (Simple, (Int, Ada_Indent_Broken))), T15 => (False, (Simple, (Int,
Ada_Indent_Broken)))));
end case;
end private_extension_declaration_19;
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)
is
Parse_Data : Wisi.Parse_Data_Type renames Wisi.Parse_Data_Type (User_Data);
T1 : constant SAL.Peek_Type := 1;
T2 : constant SAL.Peek_Type := 2;
T3 : constant SAL.Peek_Type := 3;
T4 : constant SAL.Peek_Type := 4;
T8 : constant SAL.Peek_Type := 5;
T9 : constant SAL.Peek_Type := 6;
T10 : constant SAL.Peek_Type := 7;
T11 : constant SAL.Peek_Type := 8;
T12 : constant SAL.Peek_Type := 9;
T13 : constant SAL.Peek_Type := 10;
T14 : constant SAL.Peek_Type := 11;
T15 : constant SAL.Peek_Type := 12;
begin
case Parse_Data.Post_Parse_Action is
when Navigate =>
Statement_Action (Parse_Data, Tree, Nonterm, ((T1, Statement_Start), (T15, Statement_End)));
Name_Action (Parse_Data, Tree, Nonterm, T2);
when Face =>
Face_Apply_Action (Parse_Data, Tree, Nonterm, (1 => (T2, 3, 2)));
when Indent =>
Indent_Action_0 (Parse_Data, Tree, Nonterm, (T1 => (False, (Simple, (Label => None))), T2 => (False, (Simple,
(Int, Ada_Indent_Broken))), T3 => (False, (Simple, (Int, Ada_Indent_Broken))), T4 => (False, (Simple, (Int,
Ada_Indent_Broken))), T8 => (False, (Simple, (Int, Ada_Indent_Broken))), T9 => (False, (Simple, (Int,
Ada_Indent_Broken))), T10 => (False, (Simple, (Int, Ada_Indent_Broken))), T11 => (False, (Simple, (Int,
Ada_Indent_Broken))), T12 => (False, (Simple, (Int, Ada_Indent_Broken))), T13 => (False, (Simple, (Int,
Ada_Indent_Broken))), T14 => (False, (Simple, (Label => None))), T15 => (False, (Simple, (Int,
Ada_Indent_Broken)))));
end case;
end private_extension_declaration_20;
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)
is
Parse_Data : Wisi.Parse_Data_Type renames Wisi.Parse_Data_Type (User_Data);
T1 : constant SAL.Peek_Type := 1;
T2 : constant SAL.Peek_Type := 2;
T3 : constant SAL.Peek_Type := 3;
T4 : constant SAL.Peek_Type := 4;
T8 : constant SAL.Peek_Type := 5;
T9 : constant SAL.Peek_Type := 6;
T10 : constant SAL.Peek_Type := 7;
T11 : constant SAL.Peek_Type := 8;
T12 : constant SAL.Peek_Type := 9;
T13 : constant SAL.Peek_Type := 10;
T15 : constant SAL.Peek_Type := 11;
begin
case Parse_Data.Post_Parse_Action is
when Navigate =>
Statement_Action (Parse_Data, Tree, Nonterm, ((T1, Statement_Start), (T15, Statement_End)));
Name_Action (Parse_Data, Tree, Nonterm, T2);
when Face =>
Face_Apply_Action (Parse_Data, Tree, Nonterm, (1 => (T2, 3, 2)));
when Indent =>
Indent_Action_0 (Parse_Data, Tree, Nonterm, (T1 => (False, (Simple, (Label => None))), T2 => (False, (Simple,
(Int, Ada_Indent_Broken))), T3 => (False, (Simple, (Int, Ada_Indent_Broken))), T4 => (False, (Simple, (Int,
Ada_Indent_Broken))), T8 => (False, (Simple, (Int, Ada_Indent_Broken))), T9 => (False, (Simple, (Int,
Ada_Indent_Broken))), T10 => (False, (Simple, (Int, Ada_Indent_Broken))), T11 => (False, (Simple, (Int,
Ada_Indent_Broken))), T12 => (False, (Simple, (Int, Ada_Indent_Broken))), T13 => (False, (Simple, (Int,
Ada_Indent_Broken))), T15 => (False, (Simple, (Int, Ada_Indent_Broken)))));
end case;
end private_extension_declaration_21;
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)
is
Parse_Data : Wisi.Parse_Data_Type renames Wisi.Parse_Data_Type (User_Data);
T1 : constant SAL.Peek_Type := 1;
T2 : constant SAL.Peek_Type := 2;
T3 : constant SAL.Peek_Type := 3;
T4 : constant SAL.Peek_Type := 4;
T8 : constant SAL.Peek_Type := 5;
T9 : constant SAL.Peek_Type := 6;
T12 : constant SAL.Peek_Type := 7;
T13 : constant SAL.Peek_Type := 8;
T14 : constant SAL.Peek_Type := 9;
T15 : constant SAL.Peek_Type := 10;
begin
case Parse_Data.Post_Parse_Action is
when Navigate =>
Statement_Action (Parse_Data, Tree, Nonterm, ((T1, Statement_Start), (T15, Statement_End)));
Name_Action (Parse_Data, Tree, Nonterm, T2);
when Face =>
Face_Apply_Action (Parse_Data, Tree, Nonterm, (1 => (T2, 3, 2)));
when Indent =>
Indent_Action_0 (Parse_Data, Tree, Nonterm, (T1 => (False, (Simple, (Label => None))), T2 => (False, (Simple,
(Int, Ada_Indent_Broken))), T3 => (False, (Simple, (Int, Ada_Indent_Broken))), T4 => (False, (Simple, (Int,
Ada_Indent_Broken))), T8 => (False, (Simple, (Int, Ada_Indent_Broken))), T9 => (False, (Simple, (Int,
Ada_Indent_Broken))), T12 => (False, (Simple, (Int, Ada_Indent_Broken))), T13 => (False, (Simple, (Int,
Ada_Indent_Broken))), T14 => (False, (Simple, (Label => None))), T15 => (False, (Simple, (Int,
Ada_Indent_Broken)))));
end case;
end private_extension_declaration_22;
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)
is
Parse_Data : Wisi.Parse_Data_Type renames Wisi.Parse_Data_Type (User_Data);
T1 : constant SAL.Peek_Type := 1;
T2 : constant SAL.Peek_Type := 2;
T3 : constant SAL.Peek_Type := 3;
T4 : constant SAL.Peek_Type := 4;
T8 : constant SAL.Peek_Type := 5;
T9 : constant SAL.Peek_Type := 6;
T12 : constant SAL.Peek_Type := 7;
T13 : constant SAL.Peek_Type := 8;
T15 : constant SAL.Peek_Type := 9;
begin
case Parse_Data.Post_Parse_Action is
when Navigate =>
Statement_Action (Parse_Data, Tree, Nonterm, ((T1, Statement_Start), (T15, Statement_End)));
Name_Action (Parse_Data, Tree, Nonterm, T2);
when Face =>
Face_Apply_Action (Parse_Data, Tree, Nonterm, (1 => (T2, 3, 2)));
when Indent =>
Indent_Action_0 (Parse_Data, Tree, Nonterm, (T1 => (False, (Simple, (Label => None))), T2 => (False, (Simple,
(Int, Ada_Indent_Broken))), T3 => (False, (Simple, (Int, Ada_Indent_Broken))), T4 => (False, (Simple, (Int,
Ada_Indent_Broken))), T8 => (False, (Simple, (Int, Ada_Indent_Broken))), T9 => (False, (Simple, (Int,
Ada_Indent_Broken))), T12 => (False, (Simple, (Int, Ada_Indent_Broken))), T13 => (False, (Simple, (Int,
Ada_Indent_Broken))), T15 => (False, (Simple, (Int, Ada_Indent_Broken)))));
end case;
end private_extension_declaration_23;
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)
is
Parse_Data : Wisi.Parse_Data_Type renames Wisi.Parse_Data_Type (User_Data);
T1 : constant SAL.Peek_Type := 1;
T2 : constant SAL.Peek_Type := 2;
T4 : constant SAL.Peek_Type := 3;
T5 : constant SAL.Peek_Type := 4;
T6 : constant SAL.Peek_Type := 5;
T8 : constant SAL.Peek_Type := 6;
T9 : constant SAL.Peek_Type := 7;
T10 : constant SAL.Peek_Type := 8;
T11 : constant SAL.Peek_Type := 9;
T12 : constant SAL.Peek_Type := 10;
T13 : constant SAL.Peek_Type := 11;
T14 : constant SAL.Peek_Type := 12;
T15 : constant SAL.Peek_Type := 13;
begin
case Parse_Data.Post_Parse_Action is
when Navigate =>
Statement_Action (Parse_Data, Tree, Nonterm, ((T1, Statement_Start), (T15, Statement_End)));
Name_Action (Parse_Data, Tree, Nonterm, T2);
when Face =>
Face_Apply_Action (Parse_Data, Tree, Nonterm, (1 => (T2, 3, 2)));
when Indent =>
Indent_Action_0 (Parse_Data, Tree, Nonterm, (T1 => (False, (Simple, (Label => None))), T2 => (False, (Simple,
(Int, Ada_Indent_Broken))), T4 => (False, (Simple, (Int, Ada_Indent_Broken))), T5 => (False, (Simple, (Int,
Ada_Indent_Broken))), T6 => (False, (Simple, (Int, Ada_Indent_Broken))), T8 => (False, (Simple, (Int,
Ada_Indent_Broken))), T9 => (False, (Simple, (Int, Ada_Indent_Broken))), T10 => (False, (Simple, (Int,
Ada_Indent_Broken))), T11 => (False, (Simple, (Int, Ada_Indent_Broken))), T12 => (False, (Simple, (Int,
Ada_Indent_Broken))), T13 => (False, (Simple, (Int, Ada_Indent_Broken))), T14 => (False, (Simple, (Label =>
None))), T15 => (False, (Simple, (Int, Ada_Indent_Broken)))));
end case;
end private_extension_declaration_24;
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)
is
Parse_Data : Wisi.Parse_Data_Type renames Wisi.Parse_Data_Type (User_Data);
T1 : constant SAL.Peek_Type := 1;
T2 : constant SAL.Peek_Type := 2;
T4 : constant SAL.Peek_Type := 3;
T5 : constant SAL.Peek_Type := 4;
T6 : constant SAL.Peek_Type := 5;
T8 : constant SAL.Peek_Type := 6;
T9 : constant SAL.Peek_Type := 7;
T10 : constant SAL.Peek_Type := 8;
T11 : constant SAL.Peek_Type := 9;
T12 : constant SAL.Peek_Type := 10;
T13 : constant SAL.Peek_Type := 11;
T15 : constant SAL.Peek_Type := 12;
begin
case Parse_Data.Post_Parse_Action is
when Navigate =>
Statement_Action (Parse_Data, Tree, Nonterm, ((T1, Statement_Start), (T15, Statement_End)));
Name_Action (Parse_Data, Tree, Nonterm, T2);
when Face =>
Face_Apply_Action (Parse_Data, Tree, Nonterm, (1 => (T2, 3, 2)));
when Indent =>
Indent_Action_0 (Parse_Data, Tree, Nonterm, (T1 => (False, (Simple, (Label => None))), T2 => (False, (Simple,
(Int, Ada_Indent_Broken))), T4 => (False, (Simple, (Int, Ada_Indent_Broken))), T5 => (False, (Simple, (Int,
Ada_Indent_Broken))), T6 => (False, (Simple, (Int, Ada_Indent_Broken))), T8 => (False, (Simple, (Int,
Ada_Indent_Broken))), T9 => (False, (Simple, (Int, Ada_Indent_Broken))), T10 => (False, (Simple, (Int,
Ada_Indent_Broken))), T11 => (False, (Simple, (Int, Ada_Indent_Broken))), T12 => (False, (Simple, (Int,
Ada_Indent_Broken))), T13 => (False, (Simple, (Int, Ada_Indent_Broken))), T15 => (False, (Simple, (Int,
Ada_Indent_Broken)))));
end case;
end private_extension_declaration_25;
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)
is
Parse_Data : Wisi.Parse_Data_Type renames Wisi.Parse_Data_Type (User_Data);
T1 : constant SAL.Peek_Type := 1;
T2 : constant SAL.Peek_Type := 2;
T4 : constant SAL.Peek_Type := 3;
T5 : constant SAL.Peek_Type := 4;
T6 : constant SAL.Peek_Type := 5;
T8 : constant SAL.Peek_Type := 6;
T9 : constant SAL.Peek_Type := 7;
T12 : constant SAL.Peek_Type := 8;
T13 : constant SAL.Peek_Type := 9;
T14 : constant SAL.Peek_Type := 10;
T15 : constant SAL.Peek_Type := 11;
begin
case Parse_Data.Post_Parse_Action is
when Navigate =>
Statement_Action (Parse_Data, Tree, Nonterm, ((T1, Statement_Start), (T15, Statement_End)));
Name_Action (Parse_Data, Tree, Nonterm, T2);
when Face =>
Face_Apply_Action (Parse_Data, Tree, Nonterm, (1 => (T2, 3, 2)));
when Indent =>
Indent_Action_0 (Parse_Data, Tree, Nonterm, (T1 => (False, (Simple, (Label => None))), T2 => (False, (Simple,
(Int, Ada_Indent_Broken))), T4 => (False, (Simple, (Int, Ada_Indent_Broken))), T5 => (False, (Simple, (Int,
Ada_Indent_Broken))), T6 => (False, (Simple, (Int, Ada_Indent_Broken))), T8 => (False, (Simple, (Int,
Ada_Indent_Broken))), T9 => (False, (Simple, (Int, Ada_Indent_Broken))), T12 => (False, (Simple, (Int,
Ada_Indent_Broken))), T13 => (False, (Simple, (Int, Ada_Indent_Broken))), T14 => (False, (Simple, (Label =>
None))), T15 => (False, (Simple, (Int, Ada_Indent_Broken)))));
end case;
end private_extension_declaration_26;
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)
is
Parse_Data : Wisi.Parse_Data_Type renames Wisi.Parse_Data_Type (User_Data);
T1 : constant SAL.Peek_Type := 1;
T2 : constant SAL.Peek_Type := 2;
T4 : constant SAL.Peek_Type := 3;
T5 : constant SAL.Peek_Type := 4;
T6 : constant SAL.Peek_Type := 5;
T8 : constant SAL.Peek_Type := 6;
T9 : constant SAL.Peek_Type := 7;
T12 : constant SAL.Peek_Type := 8;
T13 : constant SAL.Peek_Type := 9;
T15 : constant SAL.Peek_Type := 10;
begin
case Parse_Data.Post_Parse_Action is
when Navigate =>
Statement_Action (Parse_Data, Tree, Nonterm, ((T1, Statement_Start), (T15, Statement_End)));
Name_Action (Parse_Data, Tree, Nonterm, T2);
when Face =>
Face_Apply_Action (Parse_Data, Tree, Nonterm, (1 => (T2, 3, 2)));
when Indent =>
Indent_Action_0 (Parse_Data, Tree, Nonterm, (T1 => (False, (Simple, (Label => None))), T2 => (False, (Simple,
(Int, Ada_Indent_Broken))), T4 => (False, (Simple, (Int, Ada_Indent_Broken))), T5 => (False, (Simple, (Int,
Ada_Indent_Broken))), T6 => (False, (Simple, (Int, Ada_Indent_Broken))), T8 => (False, (Simple, (Int,
Ada_Indent_Broken))), T9 => (False, (Simple, (Int, Ada_Indent_Broken))), T12 => (False, (Simple, (Int,
Ada_Indent_Broken))), T13 => (False, (Simple, (Int, Ada_Indent_Broken))), T15 => (False, (Simple, (Int,
Ada_Indent_Broken)))));
end case;
end private_extension_declaration_27;
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)
is
Parse_Data : Wisi.Parse_Data_Type renames Wisi.Parse_Data_Type (User_Data);
T1 : constant SAL.Peek_Type := 1;
T2 : constant SAL.Peek_Type := 2;
T4 : constant SAL.Peek_Type := 3;
T5 : constant SAL.Peek_Type := 4;
T8 : constant SAL.Peek_Type := 6;
T9 : constant SAL.Peek_Type := 7;
T10 : constant SAL.Peek_Type := 8;
T11 : constant SAL.Peek_Type := 9;
T12 : constant SAL.Peek_Type := 10;
T13 : constant SAL.Peek_Type := 11;
T14 : constant SAL.Peek_Type := 12;
T15 : constant SAL.Peek_Type := 13;
T7 : constant SAL.Peek_Type := 5;
begin
case Parse_Data.Post_Parse_Action is
when Navigate =>
Statement_Action (Parse_Data, Tree, Nonterm, ((T1, Statement_Start), (T15, Statement_End)));
Name_Action (Parse_Data, Tree, Nonterm, T2);
when Face =>
Face_Apply_Action (Parse_Data, Tree, Nonterm, (1 => (T2, 3, 2)));
when Indent =>
Indent_Action_0 (Parse_Data, Tree, Nonterm, (T1 => (False, (Simple, (Label => None))), T2 => (False, (Simple,
(Int, Ada_Indent_Broken))), T4 => (False, (Simple, (Int, Ada_Indent_Broken))), T5 => (False, (Simple, (Int,
Ada_Indent_Broken))), T7 => (False, (Simple, (Int, Ada_Indent_Broken))), T8 => (False, (Simple, (Int,
Ada_Indent_Broken))), T9 => (False, (Simple, (Int, Ada_Indent_Broken))), T10 => (False, (Simple, (Int,
Ada_Indent_Broken))), T11 => (False, (Simple, (Int, Ada_Indent_Broken))), T12 => (False, (Simple, (Int,
Ada_Indent_Broken))), T13 => (False, (Simple, (Int, Ada_Indent_Broken))), T14 => (False, (Simple, (Label =>
None))), T15 => (False, (Simple, (Int, Ada_Indent_Broken)))));
end case;
end private_extension_declaration_28;
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)
is
Parse_Data : Wisi.Parse_Data_Type renames Wisi.Parse_Data_Type (User_Data);
T1 : constant SAL.Peek_Type := 1;
T2 : constant SAL.Peek_Type := 2;
T4 : constant SAL.Peek_Type := 3;
T5 : constant SAL.Peek_Type := 4;
T8 : constant SAL.Peek_Type := 6;
T9 : constant SAL.Peek_Type := 7;
T10 : constant SAL.Peek_Type := 8;
T11 : constant SAL.Peek_Type := 9;
T12 : constant SAL.Peek_Type := 10;
T13 : constant SAL.Peek_Type := 11;
T15 : constant SAL.Peek_Type := 12;
T7 : constant SAL.Peek_Type := 5;
begin
case Parse_Data.Post_Parse_Action is
when Navigate =>
Statement_Action (Parse_Data, Tree, Nonterm, ((T1, Statement_Start), (T15, Statement_End)));
Name_Action (Parse_Data, Tree, Nonterm, T2);
when Face =>
Face_Apply_Action (Parse_Data, Tree, Nonterm, (1 => (T2, 3, 2)));
when Indent =>
Indent_Action_0 (Parse_Data, Tree, Nonterm, (T1 => (False, (Simple, (Label => None))), T2 => (False, (Simple,
(Int, Ada_Indent_Broken))), T4 => (False, (Simple, (Int, Ada_Indent_Broken))), T5 => (False, (Simple, (Int,
Ada_Indent_Broken))), T7 => (False, (Simple, (Int, Ada_Indent_Broken))), T8 => (False, (Simple, (Int,
Ada_Indent_Broken))), T9 => (False, (Simple, (Int, Ada_Indent_Broken))), T10 => (False, (Simple, (Int,
Ada_Indent_Broken))), T11 => (False, (Simple, (Int, Ada_Indent_Broken))), T12 => (False, (Simple, (Int,
Ada_Indent_Broken))), T13 => (False, (Simple, (Int, Ada_Indent_Broken))), T15 => (False, (Simple, (Int,
Ada_Indent_Broken)))));
end case;
end private_extension_declaration_29;
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)
is
Parse_Data : Wisi.Parse_Data_Type renames Wisi.Parse_Data_Type (User_Data);
T1 : constant SAL.Peek_Type := 1;
T2 : constant SAL.Peek_Type := 2;
T4 : constant SAL.Peek_Type := 3;
T5 : constant SAL.Peek_Type := 4;
T8 : constant SAL.Peek_Type := 6;
T9 : constant SAL.Peek_Type := 7;
T12 : constant SAL.Peek_Type := 8;
T13 : constant SAL.Peek_Type := 9;
T14 : constant SAL.Peek_Type := 10;
T15 : constant SAL.Peek_Type := 11;
T7 : constant SAL.Peek_Type := 5;
begin
case Parse_Data.Post_Parse_Action is
when Navigate =>
Statement_Action (Parse_Data, Tree, Nonterm, ((T1, Statement_Start), (T15, Statement_End)));
Name_Action (Parse_Data, Tree, Nonterm, T2);
when Face =>
Face_Apply_Action (Parse_Data, Tree, Nonterm, (1 => (T2, 3, 2)));
when Indent =>
Indent_Action_0 (Parse_Data, Tree, Nonterm, (T1 => (False, (Simple, (Label => None))), T2 => (False, (Simple,
(Int, Ada_Indent_Broken))), T4 => (False, (Simple, (Int, Ada_Indent_Broken))), T5 => (False, (Simple, (Int,
Ada_Indent_Broken))), T7 => (False, (Simple, (Int, Ada_Indent_Broken))), T8 => (False, (Simple, (Int,
Ada_Indent_Broken))), T9 => (False, (Simple, (Int, Ada_Indent_Broken))), T12 => (False, (Simple, (Int,
Ada_Indent_Broken))), T13 => (False, (Simple, (Int, Ada_Indent_Broken))), T14 => (False, (Simple, (Label =>
None))), T15 => (False, (Simple, (Int, Ada_Indent_Broken)))));
end case;
end private_extension_declaration_30;
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)
is
Parse_Data : Wisi.Parse_Data_Type renames Wisi.Parse_Data_Type (User_Data);
T1 : constant SAL.Peek_Type := 1;
T2 : constant SAL.Peek_Type := 2;
T4 : constant SAL.Peek_Type := 3;
T5 : constant SAL.Peek_Type := 4;
T8 : constant SAL.Peek_Type := 6;
T9 : constant SAL.Peek_Type := 7;
T12 : constant SAL.Peek_Type := 8;
T13 : constant SAL.Peek_Type := 9;
T15 : constant SAL.Peek_Type := 10;
T7 : constant SAL.Peek_Type := 5;
begin
case Parse_Data.Post_Parse_Action is
when Navigate =>
Statement_Action (Parse_Data, Tree, Nonterm, ((T1, Statement_Start), (T15, Statement_End)));
Name_Action (Parse_Data, Tree, Nonterm, T2);
when Face =>
Face_Apply_Action (Parse_Data, Tree, Nonterm, (1 => (T2, 3, 2)));
when Indent =>
Indent_Action_0 (Parse_Data, Tree, Nonterm, (T1 => (False, (Simple, (Label => None))), T2 => (False, (Simple,
(Int, Ada_Indent_Broken))), T4 => (False, (Simple, (Int, Ada_Indent_Broken))), T5 => (False, (Simple, (Int,
Ada_Indent_Broken))), T7 => (False, (Simple, (Int, Ada_Indent_Broken))), T8 => (False, (Simple, (Int,
Ada_Indent_Broken))), T9 => (False, (Simple, (Int, Ada_Indent_Broken))), T12 => (False, (Simple, (Int,
Ada_Indent_Broken))), T13 => (False, (Simple, (Int, Ada_Indent_Broken))), T15 => (False, (Simple, (Int,
Ada_Indent_Broken)))));
end case;
end private_extension_declaration_31;
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)
is
Parse_Data : Wisi.Parse_Data_Type renames Wisi.Parse_Data_Type (User_Data);
T1 : constant SAL.Peek_Type := 1;
T2 : constant SAL.Peek_Type := 2;
T4 : constant SAL.Peek_Type := 3;
T5 : constant SAL.Peek_Type := 4;
T8 : constant SAL.Peek_Type := 5;
T9 : constant SAL.Peek_Type := 6;
T10 : constant SAL.Peek_Type := 7;
T11 : constant SAL.Peek_Type := 8;
T12 : constant SAL.Peek_Type := 9;
T13 : constant SAL.Peek_Type := 10;
T14 : constant SAL.Peek_Type := 11;
T15 : constant SAL.Peek_Type := 12;
begin
case Parse_Data.Post_Parse_Action is
when Navigate =>
Statement_Action (Parse_Data, Tree, Nonterm, ((T1, Statement_Start), (T15, Statement_End)));
Name_Action (Parse_Data, Tree, Nonterm, T2);
when Face =>
Face_Apply_Action (Parse_Data, Tree, Nonterm, (1 => (T2, 3, 2)));
when Indent =>
Indent_Action_0 (Parse_Data, Tree, Nonterm, (T1 => (False, (Simple, (Label => None))), T2 => (False, (Simple,
(Int, Ada_Indent_Broken))), T4 => (False, (Simple, (Int, Ada_Indent_Broken))), T5 => (False, (Simple, (Int,
Ada_Indent_Broken))), T8 => (False, (Simple, (Int, Ada_Indent_Broken))), T9 => (False, (Simple, (Int,
Ada_Indent_Broken))), T10 => (False, (Simple, (Int, Ada_Indent_Broken))), T11 => (False, (Simple, (Int,
Ada_Indent_Broken))), T12 => (False, (Simple, (Int, Ada_Indent_Broken))), T13 => (False, (Simple, (Int,
Ada_Indent_Broken))), T14 => (False, (Simple, (Label => None))), T15 => (False, (Simple, (Int,
Ada_Indent_Broken)))));
end case;
end private_extension_declaration_32;
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)
is
Parse_Data : Wisi.Parse_Data_Type renames Wisi.Parse_Data_Type (User_Data);
T1 : constant SAL.Peek_Type := 1;
T2 : constant SAL.Peek_Type := 2;
T4 : constant SAL.Peek_Type := 3;
T5 : constant SAL.Peek_Type := 4;
T8 : constant SAL.Peek_Type := 5;
T9 : constant SAL.Peek_Type := 6;
T10 : constant SAL.Peek_Type := 7;
T11 : constant SAL.Peek_Type := 8;
T12 : constant SAL.Peek_Type := 9;
T13 : constant SAL.Peek_Type := 10;
T15 : constant SAL.Peek_Type := 11;
begin
case Parse_Data.Post_Parse_Action is
when Navigate =>
Statement_Action (Parse_Data, Tree, Nonterm, ((T1, Statement_Start), (T15, Statement_End)));
Name_Action (Parse_Data, Tree, Nonterm, T2);
when Face =>
Face_Apply_Action (Parse_Data, Tree, Nonterm, (1 => (T2, 3, 2)));
when Indent =>
Indent_Action_0 (Parse_Data, Tree, Nonterm, (T1 => (False, (Simple, (Label => None))), T2 => (False, (Simple,
(Int, Ada_Indent_Broken))), T4 => (False, (Simple, (Int, Ada_Indent_Broken))), T5 => (False, (Simple, (Int,
Ada_Indent_Broken))), T8 => (False, (Simple, (Int, Ada_Indent_Broken))), T9 => (False, (Simple, (Int,
Ada_Indent_Broken))), T10 => (False, (Simple, (Int, Ada_Indent_Broken))), T11 => (False, (Simple, (Int,
Ada_Indent_Broken))), T12 => (False, (Simple, (Int, Ada_Indent_Broken))), T13 => (False, (Simple, (Int,
Ada_Indent_Broken))), T15 => (False, (Simple, (Int, Ada_Indent_Broken)))));
end case;
end private_extension_declaration_33;
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)
is
Parse_Data : Wisi.Parse_Data_Type renames Wisi.Parse_Data_Type (User_Data);
T1 : constant SAL.Peek_Type := 1;
T2 : constant SAL.Peek_Type := 2;
T4 : constant SAL.Peek_Type := 3;
T5 : constant SAL.Peek_Type := 4;
T8 : constant SAL.Peek_Type := 5;
T9 : constant SAL.Peek_Type := 6;
T12 : constant SAL.Peek_Type := 7;
T13 : constant SAL.Peek_Type := 8;
T14 : constant SAL.Peek_Type := 9;
T15 : constant SAL.Peek_Type := 10;
begin
case Parse_Data.Post_Parse_Action is
when Navigate =>
Statement_Action (Parse_Data, Tree, Nonterm, ((T1, Statement_Start), (T15, Statement_End)));
Name_Action (Parse_Data, Tree, Nonterm, T2);
when Face =>
Face_Apply_Action (Parse_Data, Tree, Nonterm, (1 => (T2, 3, 2)));
when Indent =>
Indent_Action_0 (Parse_Data, Tree, Nonterm, (T1 => (False, (Simple, (Label => None))), T2 => (False, (Simple,
(Int, Ada_Indent_Broken))), T4 => (False, (Simple, (Int, Ada_Indent_Broken))), T5 => (False, (Simple, (Int,
Ada_Indent_Broken))), T8 => (False, (Simple, (Int, Ada_Indent_Broken))), T9 => (False, (Simple, (Int,
Ada_Indent_Broken))), T12 => (False, (Simple, (Int, Ada_Indent_Broken))), T13 => (False, (Simple, (Int,
Ada_Indent_Broken))), T14 => (False, (Simple, (Label => None))), T15 => (False, (Simple, (Int,
Ada_Indent_Broken)))));
end case;
end private_extension_declaration_34;
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)
is
Parse_Data : Wisi.Parse_Data_Type renames Wisi.Parse_Data_Type (User_Data);
T1 : constant SAL.Peek_Type := 1;
T2 : constant SAL.Peek_Type := 2;
T4 : constant SAL.Peek_Type := 3;
T5 : constant SAL.Peek_Type := 4;
T8 : constant SAL.Peek_Type := 5;
T9 : constant SAL.Peek_Type := 6;
T12 : constant SAL.Peek_Type := 7;
T13 : constant SAL.Peek_Type := 8;
T15 : constant SAL.Peek_Type := 9;
begin
case Parse_Data.Post_Parse_Action is
when Navigate =>
Statement_Action (Parse_Data, Tree, Nonterm, ((T1, Statement_Start), (T15, Statement_End)));
Name_Action (Parse_Data, Tree, Nonterm, T2);
when Face =>
Face_Apply_Action (Parse_Data, Tree, Nonterm, (1 => (T2, 3, 2)));
when Indent =>
Indent_Action_0 (Parse_Data, Tree, Nonterm, (T1 => (False, (Simple, (Label => None))), T2 => (False, (Simple,
(Int, Ada_Indent_Broken))), T4 => (False, (Simple, (Int, Ada_Indent_Broken))), T5 => (False, (Simple, (Int,
Ada_Indent_Broken))), T8 => (False, (Simple, (Int, Ada_Indent_Broken))), T9 => (False, (Simple, (Int,
Ada_Indent_Broken))), T12 => (False, (Simple, (Int, Ada_Indent_Broken))), T13 => (False, (Simple, (Int,
Ada_Indent_Broken))), T15 => (False, (Simple, (Int, Ada_Indent_Broken)))));
end case;
end private_extension_declaration_35;
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)
is
Parse_Data : Wisi.Parse_Data_Type renames Wisi.Parse_Data_Type (User_Data);
T1 : constant SAL.Peek_Type := 1;
T2 : constant SAL.Peek_Type := 2;
T4 : constant SAL.Peek_Type := 3;
T6 : constant SAL.Peek_Type := 4;
T8 : constant SAL.Peek_Type := 5;
T9 : constant SAL.Peek_Type := 6;
T10 : constant SAL.Peek_Type := 7;
T11 : constant SAL.Peek_Type := 8;
T12 : constant SAL.Peek_Type := 9;
T13 : constant SAL.Peek_Type := 10;
T14 : constant SAL.Peek_Type := 11;
T15 : constant SAL.Peek_Type := 12;
begin
case Parse_Data.Post_Parse_Action is
when Navigate =>
Statement_Action (Parse_Data, Tree, Nonterm, ((T1, Statement_Start), (T15, Statement_End)));
Name_Action (Parse_Data, Tree, Nonterm, T2);
when Face =>
Face_Apply_Action (Parse_Data, Tree, Nonterm, (1 => (T2, 3, 2)));
when Indent =>
Indent_Action_0 (Parse_Data, Tree, Nonterm, (T1 => (False, (Simple, (Label => None))), T2 => (False, (Simple,
(Int, Ada_Indent_Broken))), T4 => (False, (Simple, (Int, Ada_Indent_Broken))), T6 => (False, (Simple, (Int,
Ada_Indent_Broken))), T8 => (False, (Simple, (Int, Ada_Indent_Broken))), T9 => (False, (Simple, (Int,
Ada_Indent_Broken))), T10 => (False, (Simple, (Int, Ada_Indent_Broken))), T11 => (False, (Simple, (Int,
Ada_Indent_Broken))), T12 => (False, (Simple, (Int, Ada_Indent_Broken))), T13 => (False, (Simple, (Int,
Ada_Indent_Broken))), T14 => (False, (Simple, (Label => None))), T15 => (False, (Simple, (Int,
Ada_Indent_Broken)))));
end case;
end private_extension_declaration_36;
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)
is
Parse_Data : Wisi.Parse_Data_Type renames Wisi.Parse_Data_Type (User_Data);
T1 : constant SAL.Peek_Type := 1;
T2 : constant SAL.Peek_Type := 2;
T4 : constant SAL.Peek_Type := 3;
T6 : constant SAL.Peek_Type := 4;
T8 : constant SAL.Peek_Type := 5;
T9 : constant SAL.Peek_Type := 6;
T10 : constant SAL.Peek_Type := 7;
T11 : constant SAL.Peek_Type := 8;
T12 : constant SAL.Peek_Type := 9;
T13 : constant SAL.Peek_Type := 10;
T15 : constant SAL.Peek_Type := 11;
begin
case Parse_Data.Post_Parse_Action is
when Navigate =>
Statement_Action (Parse_Data, Tree, Nonterm, ((T1, Statement_Start), (T15, Statement_End)));
Name_Action (Parse_Data, Tree, Nonterm, T2);
when Face =>
Face_Apply_Action (Parse_Data, Tree, Nonterm, (1 => (T2, 3, 2)));
when Indent =>
Indent_Action_0 (Parse_Data, Tree, Nonterm, (T1 => (False, (Simple, (Label => None))), T2 => (False, (Simple,
(Int, Ada_Indent_Broken))), T4 => (False, (Simple, (Int, Ada_Indent_Broken))), T6 => (False, (Simple, (Int,
Ada_Indent_Broken))), T8 => (False, (Simple, (Int, Ada_Indent_Broken))), T9 => (False, (Simple, (Int,
Ada_Indent_Broken))), T10 => (False, (Simple, (Int, Ada_Indent_Broken))), T11 => (False, (Simple, (Int,
Ada_Indent_Broken))), T12 => (False, (Simple, (Int, Ada_Indent_Broken))), T13 => (False, (Simple, (Int,
Ada_Indent_Broken))), T15 => (False, (Simple, (Int, Ada_Indent_Broken)))));
end case;
end private_extension_declaration_37;
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)
is
Parse_Data : Wisi.Parse_Data_Type renames Wisi.Parse_Data_Type (User_Data);
T1 : constant SAL.Peek_Type := 1;
T2 : constant SAL.Peek_Type := 2;
T4 : constant SAL.Peek_Type := 3;
T6 : constant SAL.Peek_Type := 4;
T8 : constant SAL.Peek_Type := 5;
T9 : constant SAL.Peek_Type := 6;
T12 : constant SAL.Peek_Type := 7;
T13 : constant SAL.Peek_Type := 8;
T14 : constant SAL.Peek_Type := 9;
T15 : constant SAL.Peek_Type := 10;
begin
case Parse_Data.Post_Parse_Action is
when Navigate =>
Statement_Action (Parse_Data, Tree, Nonterm, ((T1, Statement_Start), (T15, Statement_End)));
Name_Action (Parse_Data, Tree, Nonterm, T2);
when Face =>
Face_Apply_Action (Parse_Data, Tree, Nonterm, (1 => (T2, 3, 2)));
when Indent =>
Indent_Action_0 (Parse_Data, Tree, Nonterm, (T1 => (False, (Simple, (Label => None))), T2 => (False, (Simple,
(Int, Ada_Indent_Broken))), T4 => (False, (Simple, (Int, Ada_Indent_Broken))), T6 => (False, (Simple, (Int,
Ada_Indent_Broken))), T8 => (False, (Simple, (Int, Ada_Indent_Broken))), T9 => (False, (Simple, (Int,
Ada_Indent_Broken))), T12 => (False, (Simple, (Int, Ada_Indent_Broken))), T13 => (False, (Simple, (Int,
Ada_Indent_Broken))), T14 => (False, (Simple, (Label => None))), T15 => (False, (Simple, (Int,
Ada_Indent_Broken)))));
end case;
end private_extension_declaration_38;
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)
is
Parse_Data : Wisi.Parse_Data_Type renames Wisi.Parse_Data_Type (User_Data);
T1 : constant SAL.Peek_Type := 1;
T2 : constant SAL.Peek_Type := 2;
T4 : constant SAL.Peek_Type := 3;
T6 : constant SAL.Peek_Type := 4;
T8 : constant SAL.Peek_Type := 5;
T9 : constant SAL.Peek_Type := 6;
T12 : constant SAL.Peek_Type := 7;
T13 : constant SAL.Peek_Type := 8;
T15 : constant SAL.Peek_Type := 9;
begin
case Parse_Data.Post_Parse_Action is
when Navigate =>
Statement_Action (Parse_Data, Tree, Nonterm, ((T1, Statement_Start), (T15, Statement_End)));
Name_Action (Parse_Data, Tree, Nonterm, T2);
when Face =>
Face_Apply_Action (Parse_Data, Tree, Nonterm, (1 => (T2, 3, 2)));
when Indent =>
Indent_Action_0 (Parse_Data, Tree, Nonterm, (T1 => (False, (Simple, (Label => None))), T2 => (False, (Simple,
(Int, Ada_Indent_Broken))), T4 => (False, (Simple, (Int, Ada_Indent_Broken))), T6 => (False, (Simple, (Int,
Ada_Indent_Broken))), T8 => (False, (Simple, (Int, Ada_Indent_Broken))), T9 => (False, (Simple, (Int,
Ada_Indent_Broken))), T12 => (False, (Simple, (Int, Ada_Indent_Broken))), T13 => (False, (Simple, (Int,
Ada_Indent_Broken))), T15 => (False, (Simple, (Int, Ada_Indent_Broken)))));
end case;
end private_extension_declaration_39;
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)
is
Parse_Data : Wisi.Parse_Data_Type renames Wisi.Parse_Data_Type (User_Data);
T1 : constant SAL.Peek_Type := 1;
T2 : constant SAL.Peek_Type := 2;
T4 : constant SAL.Peek_Type := 3;
T8 : constant SAL.Peek_Type := 5;
T9 : constant SAL.Peek_Type := 6;
T10 : constant SAL.Peek_Type := 7;
T11 : constant SAL.Peek_Type := 8;
T12 : constant SAL.Peek_Type := 9;
T13 : constant SAL.Peek_Type := 10;
T14 : constant SAL.Peek_Type := 11;
T15 : constant SAL.Peek_Type := 12;
T7 : constant SAL.Peek_Type := 4;
begin
case Parse_Data.Post_Parse_Action is
when Navigate =>
Statement_Action (Parse_Data, Tree, Nonterm, ((T1, Statement_Start), (T15, Statement_End)));
Name_Action (Parse_Data, Tree, Nonterm, T2);
when Face =>
Face_Apply_Action (Parse_Data, Tree, Nonterm, (1 => (T2, 3, 2)));
when Indent =>
Indent_Action_0 (Parse_Data, Tree, Nonterm, (T1 => (False, (Simple, (Label => None))), T2 => (False, (Simple,
(Int, Ada_Indent_Broken))), T4 => (False, (Simple, (Int, Ada_Indent_Broken))), T7 => (False, (Simple, (Int,
Ada_Indent_Broken))), T8 => (False, (Simple, (Int, Ada_Indent_Broken))), T9 => (False, (Simple, (Int,
Ada_Indent_Broken))), T10 => (False, (Simple, (Int, Ada_Indent_Broken))), T11 => (False, (Simple, (Int,
Ada_Indent_Broken))), T12 => (False, (Simple, (Int, Ada_Indent_Broken))), T13 => (False, (Simple, (Int,
Ada_Indent_Broken))), T14 => (False, (Simple, (Label => None))), T15 => (False, (Simple, (Int,
Ada_Indent_Broken)))));
end case;
end private_extension_declaration_40;
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)
is
Parse_Data : Wisi.Parse_Data_Type renames Wisi.Parse_Data_Type (User_Data);
T1 : constant SAL.Peek_Type := 1;
T2 : constant SAL.Peek_Type := 2;
T4 : constant SAL.Peek_Type := 3;
T8 : constant SAL.Peek_Type := 5;
T9 : constant SAL.Peek_Type := 6;
T10 : constant SAL.Peek_Type := 7;
T11 : constant SAL.Peek_Type := 8;
T12 : constant SAL.Peek_Type := 9;
T13 : constant SAL.Peek_Type := 10;
T15 : constant SAL.Peek_Type := 11;
T7 : constant SAL.Peek_Type := 4;
begin
case Parse_Data.Post_Parse_Action is
when Navigate =>
Statement_Action (Parse_Data, Tree, Nonterm, ((T1, Statement_Start), (T15, Statement_End)));
Name_Action (Parse_Data, Tree, Nonterm, T2);
when Face =>
Face_Apply_Action (Parse_Data, Tree, Nonterm, (1 => (T2, 3, 2)));
when Indent =>
Indent_Action_0 (Parse_Data, Tree, Nonterm, (T1 => (False, (Simple, (Label => None))), T2 => (False, (Simple,
(Int, Ada_Indent_Broken))), T4 => (False, (Simple, (Int, Ada_Indent_Broken))), T7 => (False, (Simple, (Int,
Ada_Indent_Broken))), T8 => (False, (Simple, (Int, Ada_Indent_Broken))), T9 => (False, (Simple, (Int,
Ada_Indent_Broken))), T10 => (False, (Simple, (Int, Ada_Indent_Broken))), T11 => (False, (Simple, (Int,
Ada_Indent_Broken))), T12 => (False, (Simple, (Int, Ada_Indent_Broken))), T13 => (False, (Simple, (Int,
Ada_Indent_Broken))), T15 => (False, (Simple, (Int, Ada_Indent_Broken)))));
end case;
end private_extension_declaration_41;
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)
is
Parse_Data : Wisi.Parse_Data_Type renames Wisi.Parse_Data_Type (User_Data);
T1 : constant SAL.Peek_Type := 1;
T2 : constant SAL.Peek_Type := 2;
T4 : constant SAL.Peek_Type := 3;
T8 : constant SAL.Peek_Type := 5;
T9 : constant SAL.Peek_Type := 6;
T12 : constant SAL.Peek_Type := 7;
T13 : constant SAL.Peek_Type := 8;
T14 : constant SAL.Peek_Type := 9;
T15 : constant SAL.Peek_Type := 10;
T7 : constant SAL.Peek_Type := 4;
begin
case Parse_Data.Post_Parse_Action is
when Navigate =>
Statement_Action (Parse_Data, Tree, Nonterm, ((T1, Statement_Start), (T15, Statement_End)));
Name_Action (Parse_Data, Tree, Nonterm, T2);
when Face =>
Face_Apply_Action (Parse_Data, Tree, Nonterm, (1 => (T2, 3, 2)));
when Indent =>
Indent_Action_0 (Parse_Data, Tree, Nonterm, (T1 => (False, (Simple, (Label => None))), T2 => (False, (Simple,
(Int, Ada_Indent_Broken))), T4 => (False, (Simple, (Int, Ada_Indent_Broken))), T7 => (False, (Simple, (Int,
Ada_Indent_Broken))), T8 => (False, (Simple, (Int, Ada_Indent_Broken))), T9 => (False, (Simple, (Int,
Ada_Indent_Broken))), T12 => (False, (Simple, (Int, Ada_Indent_Broken))), T13 => (False, (Simple, (Int,
Ada_Indent_Broken))), T14 => (False, (Simple, (Label => None))), T15 => (False, (Simple, (Int,
Ada_Indent_Broken)))));
end case;
end private_extension_declaration_42;
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)
is
Parse_Data : Wisi.Parse_Data_Type renames Wisi.Parse_Data_Type (User_Data);
T1 : constant SAL.Peek_Type := 1;
T2 : constant SAL.Peek_Type := 2;
T4 : constant SAL.Peek_Type := 3;
T8 : constant SAL.Peek_Type := 5;
T9 : constant SAL.Peek_Type := 6;
T12 : constant SAL.Peek_Type := 7;
T13 : constant SAL.Peek_Type := 8;
T15 : constant SAL.Peek_Type := 9;
T7 : constant SAL.Peek_Type := 4;
begin
case Parse_Data.Post_Parse_Action is
when Navigate =>
Statement_Action (Parse_Data, Tree, Nonterm, ((T1, Statement_Start), (T15, Statement_End)));
Name_Action (Parse_Data, Tree, Nonterm, T2);
when Face =>
Face_Apply_Action (Parse_Data, Tree, Nonterm, (1 => (T2, 3, 2)));
when Indent =>
Indent_Action_0 (Parse_Data, Tree, Nonterm, (T1 => (False, (Simple, (Label => None))), T2 => (False, (Simple,
(Int, Ada_Indent_Broken))), T4 => (False, (Simple, (Int, Ada_Indent_Broken))), T7 => (False, (Simple, (Int,
Ada_Indent_Broken))), T8 => (False, (Simple, (Int, Ada_Indent_Broken))), T9 => (False, (Simple, (Int,
Ada_Indent_Broken))), T12 => (False, (Simple, (Int, Ada_Indent_Broken))), T13 => (False, (Simple, (Int,
Ada_Indent_Broken))), T15 => (False, (Simple, (Int, Ada_Indent_Broken)))));
end case;
end private_extension_declaration_43;
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)
is
Parse_Data : Wisi.Parse_Data_Type renames Wisi.Parse_Data_Type (User_Data);
T1 : constant SAL.Peek_Type := 1;
T2 : constant SAL.Peek_Type := 2;
T4 : constant SAL.Peek_Type := 3;
T8 : constant SAL.Peek_Type := 4;
T9 : constant SAL.Peek_Type := 5;
T10 : constant SAL.Peek_Type := 6;
T11 : constant SAL.Peek_Type := 7;
T12 : constant SAL.Peek_Type := 8;
T13 : constant SAL.Peek_Type := 9;
T14 : constant SAL.Peek_Type := 10;
T15 : constant SAL.Peek_Type := 11;
begin
case Parse_Data.Post_Parse_Action is
when Navigate =>
Statement_Action (Parse_Data, Tree, Nonterm, ((T1, Statement_Start), (T15, Statement_End)));
Name_Action (Parse_Data, Tree, Nonterm, T2);
when Face =>
Face_Apply_Action (Parse_Data, Tree, Nonterm, (1 => (T2, 3, 2)));
when Indent =>
Indent_Action_0 (Parse_Data, Tree, Nonterm, (T1 => (False, (Simple, (Label => None))), T2 => (False, (Simple,
(Int, Ada_Indent_Broken))), T4 => (False, (Simple, (Int, Ada_Indent_Broken))), T8 => (False, (Simple, (Int,
Ada_Indent_Broken))), T9 => (False, (Simple, (Int, Ada_Indent_Broken))), T10 => (False, (Simple, (Int,
Ada_Indent_Broken))), T11 => (False, (Simple, (Int, Ada_Indent_Broken))), T12 => (False, (Simple, (Int,
Ada_Indent_Broken))), T13 => (False, (Simple, (Int, Ada_Indent_Broken))), T14 => (False, (Simple, (Label =>
None))), T15 => (False, (Simple, (Int, Ada_Indent_Broken)))));
end case;
end private_extension_declaration_44;
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)
is
Parse_Data : Wisi.Parse_Data_Type renames Wisi.Parse_Data_Type (User_Data);
T1 : constant SAL.Peek_Type := 1;
T2 : constant SAL.Peek_Type := 2;
T4 : constant SAL.Peek_Type := 3;
T8 : constant SAL.Peek_Type := 4;
T9 : constant SAL.Peek_Type := 5;
T10 : constant SAL.Peek_Type := 6;
T11 : constant SAL.Peek_Type := 7;
T12 : constant SAL.Peek_Type := 8;
T13 : constant SAL.Peek_Type := 9;
T15 : constant SAL.Peek_Type := 10;
begin
case Parse_Data.Post_Parse_Action is
when Navigate =>
Statement_Action (Parse_Data, Tree, Nonterm, ((T1, Statement_Start), (T15, Statement_End)));
Name_Action (Parse_Data, Tree, Nonterm, T2);
when Face =>
Face_Apply_Action (Parse_Data, Tree, Nonterm, (1 => (T2, 3, 2)));
when Indent =>
Indent_Action_0 (Parse_Data, Tree, Nonterm, (T1 => (False, (Simple, (Label => None))), T2 => (False, (Simple,
(Int, Ada_Indent_Broken))), T4 => (False, (Simple, (Int, Ada_Indent_Broken))), T8 => (False, (Simple, (Int,
Ada_Indent_Broken))), T9 => (False, (Simple, (Int, Ada_Indent_Broken))), T10 => (False, (Simple, (Int,
Ada_Indent_Broken))), T11 => (False, (Simple, (Int, Ada_Indent_Broken))), T12 => (False, (Simple, (Int,
Ada_Indent_Broken))), T13 => (False, (Simple, (Int, Ada_Indent_Broken))), T15 => (False, (Simple, (Int,
Ada_Indent_Broken)))));
end case;
end private_extension_declaration_45;
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)
is
Parse_Data : Wisi.Parse_Data_Type renames Wisi.Parse_Data_Type (User_Data);
T1 : constant SAL.Peek_Type := 1;
T2 : constant SAL.Peek_Type := 2;
T4 : constant SAL.Peek_Type := 3;
T8 : constant SAL.Peek_Type := 4;
T9 : constant SAL.Peek_Type := 5;
T12 : constant SAL.Peek_Type := 6;
T13 : constant SAL.Peek_Type := 7;
T14 : constant SAL.Peek_Type := 8;
T15 : constant SAL.Peek_Type := 9;
begin
case Parse_Data.Post_Parse_Action is
when Navigate =>
Statement_Action (Parse_Data, Tree, Nonterm, ((T1, Statement_Start), (T15, Statement_End)));
Name_Action (Parse_Data, Tree, Nonterm, T2);
when Face =>
Face_Apply_Action (Parse_Data, Tree, Nonterm, (1 => (T2, 3, 2)));
when Indent =>
Indent_Action_0 (Parse_Data, Tree, Nonterm, (T1 => (False, (Simple, (Label => None))), T2 => (False, (Simple,
(Int, Ada_Indent_Broken))), T4 => (False, (Simple, (Int, Ada_Indent_Broken))), T8 => (False, (Simple, (Int,
Ada_Indent_Broken))), T9 => (False, (Simple, (Int, Ada_Indent_Broken))), T12 => (False, (Simple, (Int,
Ada_Indent_Broken))), T13 => (False, (Simple, (Int, Ada_Indent_Broken))), T14 => (False, (Simple, (Label =>
None))), T15 => (False, (Simple, (Int, Ada_Indent_Broken)))));
end case;
end private_extension_declaration_46;
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)
is
Parse_Data : Wisi.Parse_Data_Type renames Wisi.Parse_Data_Type (User_Data);
T1 : constant SAL.Peek_Type := 1;
T2 : constant SAL.Peek_Type := 2;
T4 : constant SAL.Peek_Type := 3;
T8 : constant SAL.Peek_Type := 4;
T9 : constant SAL.Peek_Type := 5;
T12 : constant SAL.Peek_Type := 6;
T13 : constant SAL.Peek_Type := 7;
T15 : constant SAL.Peek_Type := 8;
begin
case Parse_Data.Post_Parse_Action is
when Navigate =>
Statement_Action (Parse_Data, Tree, Nonterm, ((T1, Statement_Start), (T15, Statement_End)));
Name_Action (Parse_Data, Tree, Nonterm, T2);
when Face =>
Face_Apply_Action (Parse_Data, Tree, Nonterm, (1 => (T2, 3, 2)));
when Indent =>
Indent_Action_0 (Parse_Data, Tree, Nonterm, (T1 => (False, (Simple, (Label => None))), T2 => (False, (Simple,
(Int, Ada_Indent_Broken))), T4 => (False, (Simple, (Int, Ada_Indent_Broken))), T8 => (False, (Simple, (Int,
Ada_Indent_Broken))), T9 => (False, (Simple, (Int, Ada_Indent_Broken))), T12 => (False, (Simple, (Int,
Ada_Indent_Broken))), T13 => (False, (Simple, (Int, Ada_Indent_Broken))), T15 => (False, (Simple, (Int,
Ada_Indent_Broken)))));
end case;
end private_extension_declaration_47;
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)
is
Parse_Data : Wisi.Parse_Data_Type renames Wisi.Parse_Data_Type (User_Data);
T1 : constant SAL.Peek_Type := 1;
T2 : constant SAL.Peek_Type := 2;
begin
case Parse_Data.Post_Parse_Action is
when Navigate =>
Statement_Action (Parse_Data, Tree, Nonterm, ((T1, Statement_Start), (T2, Statement_Override)));
when Face =>
null;
when Indent =>
null;
end case;
end overriding_indicator_0;
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)
is
Parse_Data : Wisi.Parse_Data_Type renames Wisi.Parse_Data_Type (User_Data);
T2 : constant SAL.Peek_Type := 1;
begin
case Parse_Data.Post_Parse_Action is
when Navigate =>
Statement_Action (Parse_Data, Tree, Nonterm, (1 => (T2, Statement_Override)));
when Face =>
null;
when Indent =>
null;
end case;
end overriding_indicator_1;
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)
is
Parse_Data : Wisi.Parse_Data_Type renames Wisi.Parse_Data_Type (User_Data);
T1 : constant SAL.Peek_Type := 1;
T2 : constant SAL.Peek_Type := 2;
T3 : constant SAL.Peek_Type := 3;
begin
case Parse_Data.Post_Parse_Action is
when Navigate =>
Statement_Action (Parse_Data, Tree, Nonterm, ((T1, Statement_Start), (T3, Statement_End)));
when Face =>
Face_Apply_List_Action (Parse_Data, Tree, Nonterm, (1 => (T2, 1, 1)));
when Indent =>
Indent_Action_0 (Parse_Data, Tree, Nonterm, (T1 => (False, (Simple, (Label => None))), T2 => (False, (Simple,
(Int, Ada_Indent_Use))), T3 => (False, (Simple, (Int, Ada_Indent_Broken)))));
end case;
end use_package_clause_0;
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)
is
Parse_Data : Wisi.Parse_Data_Type renames Wisi.Parse_Data_Type (User_Data);
T1 : constant SAL.Peek_Type := 1;
T2 : constant SAL.Peek_Type := 2;
T3 : constant SAL.Peek_Type := 3;
T4 : constant SAL.Peek_Type := 4;
T5 : constant SAL.Peek_Type := 5;
begin
case Parse_Data.Post_Parse_Action is
when Navigate =>
Statement_Action (Parse_Data, Tree, Nonterm, ((T1, Statement_Start), (T5, Statement_End)));
when Face =>
Face_Apply_List_Action (Parse_Data, Tree, Nonterm, (1 => (T4, 1, 2)));
when Indent =>
Indent_Action_0 (Parse_Data, Tree, Nonterm, (T1 => (False, (Simple, (Label => None))), T2 => (False, (Simple,
(Int, Ada_Indent_Broken))), T3 => (False, (Simple, (Int, Ada_Indent_Broken))), T4 => (False, (Simple, (Int,
Ada_Indent_Use))), T5 => (False, (Simple, (Int, Ada_Indent_Broken)))));
end case;
end use_type_clause_0;
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)
is
Parse_Data : Wisi.Parse_Data_Type renames Wisi.Parse_Data_Type (User_Data);
T1 : constant SAL.Peek_Type := 1;
T3 : constant SAL.Peek_Type := 2;
T4 : constant SAL.Peek_Type := 3;
T5 : constant SAL.Peek_Type := 4;
begin
case Parse_Data.Post_Parse_Action is
when Navigate =>
Statement_Action (Parse_Data, Tree, Nonterm, ((T1, Statement_Start), (T5, Statement_End)));
when Face =>
Face_Apply_List_Action (Parse_Data, Tree, Nonterm, (1 => (T4, 1, 2)));
when Indent =>
Indent_Action_0 (Parse_Data, Tree, Nonterm, (T1 => (False, (Simple, (Label => None))), T3 => (False, (Simple,
(Int, Ada_Indent_Broken))), T4 => (False, (Simple, (Int, Ada_Indent_Use))), T5 => (False, (Simple, (Int,
Ada_Indent_Broken)))));
end case;
end use_type_clause_1;
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)
is
Parse_Data : Wisi.Parse_Data_Type renames Wisi.Parse_Data_Type (User_Data);
T1 : constant SAL.Peek_Type := 1;
T2 : constant SAL.Peek_Type := 2;
T3 : constant SAL.Peek_Type := 3;
T4 : constant SAL.Peek_Type := 4;
T5 : constant SAL.Peek_Type := 5;
T6 : constant SAL.Peek_Type := 6;
T7 : constant SAL.Peek_Type := 7;
T8 : constant SAL.Peek_Type := 8;
begin
case Parse_Data.Post_Parse_Action is
when Navigate =>
Statement_Action (Parse_Data, Tree, Nonterm, ((T1, Statement_Start), (T8, Statement_End)));
Name_Action (Parse_Data, Tree, Nonterm, T1);
when Face =>
Face_Apply_Action (Parse_Data, Tree, Nonterm, (1 => (T4, 1, 2)));
when Indent =>
Indent_Action_0 (Parse_Data, Tree, Nonterm, (T1 => (False, (Simple, (Label => None))), T2 => (False, (Simple,
(Int, Ada_Indent_Broken))), T3 => (False, (Simple, (Int, Ada_Indent_Broken))), T4 => (False, (Hanging_2, (Int,
Ada_Indent_Broken), (Int, Ada_Indent_Broken))), T5 => (False, (Simple, (Int, Ada_Indent_Broken))), T6 =>
(False, (Hanging_2, (Int, Ada_Indent_Broken), (Int, Ada_Indent_Broken))), T7 => (False, (Simple, (Int,
Ada_Indent_Broken))), T8 => (False, (Simple, (Int, Ada_Indent_Broken)))));
end case;
end object_renaming_declaration_0;
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)
is
Parse_Data : Wisi.Parse_Data_Type renames Wisi.Parse_Data_Type (User_Data);
T1 : constant SAL.Peek_Type := 1;
T2 : constant SAL.Peek_Type := 2;
T3 : constant SAL.Peek_Type := 3;
T4 : constant SAL.Peek_Type := 4;
T5 : constant SAL.Peek_Type := 5;
T6 : constant SAL.Peek_Type := 6;
T8 : constant SAL.Peek_Type := 7;
begin
case Parse_Data.Post_Parse_Action is
when Navigate =>
Statement_Action (Parse_Data, Tree, Nonterm, ((T1, Statement_Start), (T8, Statement_End)));
Name_Action (Parse_Data, Tree, Nonterm, T1);
when Face =>
Face_Apply_Action (Parse_Data, Tree, Nonterm, (1 => (T4, 1, 2)));
when Indent =>
Indent_Action_0 (Parse_Data, Tree, Nonterm, (T1 => (False, (Simple, (Label => None))), T2 => (False, (Simple,
(Int, Ada_Indent_Broken))), T3 => (False, (Simple, (Int, Ada_Indent_Broken))), T4 => (False, (Hanging_2, (Int,
Ada_Indent_Broken), (Int, Ada_Indent_Broken))), T5 => (False, (Simple, (Int, Ada_Indent_Broken))), T6 =>
(False, (Hanging_2, (Int, Ada_Indent_Broken), (Int, Ada_Indent_Broken))), T8 => (False, (Simple, (Int,
Ada_Indent_Broken)))));
end case;
end object_renaming_declaration_1;
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)
is
Parse_Data : Wisi.Parse_Data_Type renames Wisi.Parse_Data_Type (User_Data);
T1 : constant SAL.Peek_Type := 1;
T2 : constant SAL.Peek_Type := 2;
T4 : constant SAL.Peek_Type := 3;
T5 : constant SAL.Peek_Type := 4;
T6 : constant SAL.Peek_Type := 5;
T7 : constant SAL.Peek_Type := 6;
T8 : constant SAL.Peek_Type := 7;
begin
case Parse_Data.Post_Parse_Action is
when Navigate =>
Statement_Action (Parse_Data, Tree, Nonterm, ((T1, Statement_Start), (T8, Statement_End)));
Name_Action (Parse_Data, Tree, Nonterm, T1);
when Face =>
Face_Apply_Action (Parse_Data, Tree, Nonterm, (1 => (T4, 1, 2)));
when Indent =>
Indent_Action_0 (Parse_Data, Tree, Nonterm, (T1 => (False, (Simple, (Label => None))), T2 => (False, (Simple,
(Int, Ada_Indent_Broken))), T4 => (False, (Hanging_2, (Int, Ada_Indent_Broken), (Int, Ada_Indent_Broken))), T5
=> (False, (Simple, (Int, Ada_Indent_Broken))), T6 => (False, (Hanging_2, (Int, Ada_Indent_Broken), (Int,
Ada_Indent_Broken))), T7 => (False, (Simple, (Int, Ada_Indent_Broken))), T8 => (False, (Simple, (Int,
Ada_Indent_Broken)))));
end case;
end object_renaming_declaration_2;
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)
is
Parse_Data : Wisi.Parse_Data_Type renames Wisi.Parse_Data_Type (User_Data);
T1 : constant SAL.Peek_Type := 1;
T2 : constant SAL.Peek_Type := 2;
T4 : constant SAL.Peek_Type := 3;
T5 : constant SAL.Peek_Type := 4;
T6 : constant SAL.Peek_Type := 5;
T8 : constant SAL.Peek_Type := 6;
begin
case Parse_Data.Post_Parse_Action is
when Navigate =>
Statement_Action (Parse_Data, Tree, Nonterm, ((T1, Statement_Start), (T8, Statement_End)));
Name_Action (Parse_Data, Tree, Nonterm, T1);
when Face =>
Face_Apply_Action (Parse_Data, Tree, Nonterm, (1 => (T4, 1, 2)));
when Indent =>
Indent_Action_0 (Parse_Data, Tree, Nonterm, (T1 => (False, (Simple, (Label => None))), T2 => (False, (Simple,
(Int, Ada_Indent_Broken))), T4 => (False, (Hanging_2, (Int, Ada_Indent_Broken), (Int, Ada_Indent_Broken))), T5
=> (False, (Simple, (Int, Ada_Indent_Broken))), T6 => (False, (Hanging_2, (Int, Ada_Indent_Broken), (Int,
Ada_Indent_Broken))), T8 => (False, (Simple, (Int, Ada_Indent_Broken)))));
end case;
end object_renaming_declaration_3;
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)
is
Parse_Data : Wisi.Parse_Data_Type renames Wisi.Parse_Data_Type (User_Data);
T1 : constant SAL.Peek_Type := 1;
T5 : constant SAL.Peek_Type := 2;
T6 : constant SAL.Peek_Type := 3;
T7 : constant SAL.Peek_Type := 4;
T8 : constant SAL.Peek_Type := 5;
begin
case Parse_Data.Post_Parse_Action is
when Navigate =>
Statement_Action (Parse_Data, Tree, Nonterm, ((T1, Statement_Start), (T8, Statement_End)));
Name_Action (Parse_Data, Tree, Nonterm, T1);
when Face =>
null;
when Indent =>
Indent_Action_0 (Parse_Data, Tree, Nonterm, (T1 => (False, (Simple, (Label => None))), T5 => (False, (Simple,
(Int, Ada_Indent_Broken))), T6 => (False, (Hanging_2, (Int, Ada_Indent_Broken), (Int, Ada_Indent_Broken))), T7
=> (False, (Simple, (Int, Ada_Indent_Broken))), T8 => (False, (Simple, (Int, Ada_Indent_Broken)))));
end case;
end object_renaming_declaration_4;
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)
is
Parse_Data : Wisi.Parse_Data_Type renames Wisi.Parse_Data_Type (User_Data);
T1 : constant SAL.Peek_Type := 1;
T5 : constant SAL.Peek_Type := 2;
T6 : constant SAL.Peek_Type := 3;
T8 : constant SAL.Peek_Type := 4;
begin
case Parse_Data.Post_Parse_Action is
when Navigate =>
Statement_Action (Parse_Data, Tree, Nonterm, ((T1, Statement_Start), (T8, Statement_End)));
Name_Action (Parse_Data, Tree, Nonterm, T1);
when Face =>
null;
when Indent =>
Indent_Action_0 (Parse_Data, Tree, Nonterm, (T1 => (False, (Simple, (Label => None))), T5 => (False, (Simple,
(Int, Ada_Indent_Broken))), T6 => (False, (Hanging_2, (Int, Ada_Indent_Broken), (Int, Ada_Indent_Broken))), T8
=> (False, (Simple, (Int, Ada_Indent_Broken)))));
end case;
end object_renaming_declaration_5;
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)
is
Parse_Data : Wisi.Parse_Data_Type renames Wisi.Parse_Data_Type (User_Data);
T1 : constant SAL.Peek_Type := 1;
T2 : constant SAL.Peek_Type := 2;
T3 : constant SAL.Peek_Type := 3;
T4 : constant SAL.Peek_Type := 4;
T5 : constant SAL.Peek_Type := 5;
T6 : constant SAL.Peek_Type := 6;
T7 : constant SAL.Peek_Type := 7;
begin
case Parse_Data.Post_Parse_Action is
when Navigate =>
Statement_Action (Parse_Data, Tree, Nonterm, ((T1, Statement_Start), (T7, Statement_End)));
Name_Action (Parse_Data, Tree, Nonterm, T1);
when Face =>
null;
when Indent =>
Indent_Action_0 (Parse_Data, Tree, Nonterm, (T1 => (False, (Simple, (Label => None))), T2 => (False, (Simple,
(Int, Ada_Indent_Broken))), T3 => (False, (Simple, (Int, Ada_Indent_Broken))), T4 => (False, (Simple, (Int,
Ada_Indent_Broken))), T5 => (False, (Hanging_2, (Int, Ada_Indent_Broken), (Int, Ada_Indent_Broken))), T6 =>
(False, (Simple, (Int, Ada_Indent_Broken))), T7 => (False, (Simple, (Int, Ada_Indent_Broken)))));
end case;
end object_renaming_declaration_6;
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)
is
Parse_Data : Wisi.Parse_Data_Type renames Wisi.Parse_Data_Type (User_Data);
T1 : constant SAL.Peek_Type := 1;
T2 : constant SAL.Peek_Type := 2;
T3 : constant SAL.Peek_Type := 3;
T4 : constant SAL.Peek_Type := 4;
T5 : constant SAL.Peek_Type := 5;
T7 : constant SAL.Peek_Type := 6;
begin
case Parse_Data.Post_Parse_Action is
when Navigate =>
Statement_Action (Parse_Data, Tree, Nonterm, ((T1, Statement_Start), (T7, Statement_End)));
Name_Action (Parse_Data, Tree, Nonterm, T1);
when Face =>
null;
when Indent =>
Indent_Action_0 (Parse_Data, Tree, Nonterm, (T1 => (False, (Simple, (Label => None))), T2 => (False, (Simple,
(Int, Ada_Indent_Broken))), T3 => (False, (Simple, (Int, Ada_Indent_Broken))), T4 => (False, (Simple, (Int,
Ada_Indent_Broken))), T5 => (False, (Hanging_2, (Int, Ada_Indent_Broken), (Int, Ada_Indent_Broken))), T7 =>
(False, (Simple, (Int, Ada_Indent_Broken)))));
end case;
end object_renaming_declaration_7;
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)
is
Parse_Data : Wisi.Parse_Data_Type renames Wisi.Parse_Data_Type (User_Data);
T1 : constant SAL.Peek_Type := 1;
T2 : constant SAL.Peek_Type := 2;
T3 : constant SAL.Peek_Type := 3;
T4 : constant SAL.Peek_Type := 4;
T5 : constant SAL.Peek_Type := 5;
T6 : constant SAL.Peek_Type := 6;
T7 : constant SAL.Peek_Type := 7;
begin
case Parse_Data.Post_Parse_Action is
when Navigate =>
Statement_Action (Parse_Data, Tree, Nonterm, ((T1, Statement_Start), (T7, Statement_End)));
Name_Action (Parse_Data, Tree, Nonterm, T1);
when Face =>
Face_Apply_Action (Parse_Data, Tree, Nonterm, (1 => (T5, 1, 3)));
when Indent =>
Indent_Action_0 (Parse_Data, Tree, Nonterm, (T1 => (False, (Simple, (Label => None))), T2 => (False, (Simple,
(Int, Ada_Indent_Broken))), T3 => (False, (Simple, (Int, Ada_Indent_Broken))), T4 => (False, (Simple, (Int,
Ada_Indent_Broken))), T5 => (False, (Hanging_2, (Int, Ada_Indent_Broken), (Int, Ada_Indent_Broken))), T6 =>
(False, (Simple, (Int, Ada_Indent_Broken))), T7 => (False, (Simple, (Int, Ada_Indent_Broken)))));
end case;
end exception_renaming_declaration_0;
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)
is
Parse_Data : Wisi.Parse_Data_Type renames Wisi.Parse_Data_Type (User_Data);
T1 : constant SAL.Peek_Type := 1;
T2 : constant SAL.Peek_Type := 2;
T3 : constant SAL.Peek_Type := 3;
T4 : constant SAL.Peek_Type := 4;
T5 : constant SAL.Peek_Type := 5;
T7 : constant SAL.Peek_Type := 6;
begin
case Parse_Data.Post_Parse_Action is
when Navigate =>
Statement_Action (Parse_Data, Tree, Nonterm, ((T1, Statement_Start), (T7, Statement_End)));
Name_Action (Parse_Data, Tree, Nonterm, T1);
when Face =>
Face_Apply_Action (Parse_Data, Tree, Nonterm, (1 => (T5, 1, 3)));
when Indent =>
Indent_Action_0 (Parse_Data, Tree, Nonterm, (T1 => (False, (Simple, (Label => None))), T2 => (False, (Simple,
(Int, Ada_Indent_Broken))), T3 => (False, (Simple, (Int, Ada_Indent_Broken))), T4 => (False, (Simple, (Int,
Ada_Indent_Broken))), T5 => (False, (Hanging_2, (Int, Ada_Indent_Broken), (Int, Ada_Indent_Broken))), T7 =>
(False, (Simple, (Int, Ada_Indent_Broken)))));
end case;
end exception_renaming_declaration_1;
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)
is
Parse_Data : Wisi.Parse_Data_Type renames Wisi.Parse_Data_Type (User_Data);
T1 : constant SAL.Peek_Type := 1;
T2 : constant SAL.Peek_Type := 2;
T3 : constant SAL.Peek_Type := 3;
T4 : constant SAL.Peek_Type := 4;
T5 : constant SAL.Peek_Type := 5;
T6 : constant SAL.Peek_Type := 6;
begin
case Parse_Data.Post_Parse_Action is
when Navigate =>
Statement_Action (Parse_Data, Tree, Nonterm, ((T1, Statement_Start), (T6, Statement_End)));
Name_Action (Parse_Data, Tree, Nonterm, T2);
when Face =>
Face_Apply_Action (Parse_Data, Tree, Nonterm, ((T2, 1, 1), (T4, 1, 1)));
when Indent =>
Indent_Action_0 (Parse_Data, Tree, Nonterm, (T1 => (False, (Simple, (Label => None))), T2 => (False,
(Hanging_2, (Int, Ada_Indent_Broken), (Int, Ada_Indent_Broken))), T3 => (False, (Simple, (Int,
Ada_Indent_Broken))), T4 => (False, (Hanging_2, (Int, Ada_Indent_Broken), (Int, Ada_Indent_Broken))), T5 =>
(False, (Simple, (Label => None))), T6 => (False, (Simple, (Int, Ada_Indent_Broken)))));
end case;
end package_renaming_declaration_0;
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)
is
Parse_Data : Wisi.Parse_Data_Type renames Wisi.Parse_Data_Type (User_Data);
T1 : constant SAL.Peek_Type := 1;
T2 : constant SAL.Peek_Type := 2;
T3 : constant SAL.Peek_Type := 3;
T4 : constant SAL.Peek_Type := 4;
T6 : constant SAL.Peek_Type := 5;
begin
case Parse_Data.Post_Parse_Action is
when Navigate =>
Statement_Action (Parse_Data, Tree, Nonterm, ((T1, Statement_Start), (T6, Statement_End)));
Name_Action (Parse_Data, Tree, Nonterm, T2);
when Face =>
Face_Apply_Action (Parse_Data, Tree, Nonterm, ((T2, 1, 1), (T4, 1, 1)));
when Indent =>
Indent_Action_0 (Parse_Data, Tree, Nonterm, (T1 => (False, (Simple, (Label => None))), T2 => (False,
(Hanging_2, (Int, Ada_Indent_Broken), (Int, Ada_Indent_Broken))), T3 => (False, (Simple, (Int,
Ada_Indent_Broken))), T4 => (False, (Hanging_2, (Int, Ada_Indent_Broken), (Int, Ada_Indent_Broken))), T6 =>
(False, (Simple, (Int, Ada_Indent_Broken)))));
end case;
end package_renaming_declaration_1;
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)
is
Parse_Data : Wisi.Parse_Data_Type renames Wisi.Parse_Data_Type (User_Data);
T1 : constant SAL.Peek_Type := 1;
T2 : constant SAL.Peek_Type := 2;
T3 : constant SAL.Peek_Type := 3;
T4 : constant SAL.Peek_Type := 4;
T5 : constant SAL.Peek_Type := 5;
T6 : constant SAL.Peek_Type := 6;
begin
case Parse_Data.Post_Parse_Action is
when Navigate =>
Statement_Action (Parse_Data, Tree, Nonterm, ((T1, Statement_Start), (T2, Statement_Override), (T6,
Statement_End)));
when Face =>
Face_Apply_Action (Parse_Data, Tree, Nonterm, (1 => (T4, 1, 1)));
when Indent =>
Indent_Action_0 (Parse_Data, Tree, Nonterm, (T1 => (False, (Simple, (Label => None))), T2 => (False, (Simple,
(Label => None))), T3 => (False, (Simple, (Language, Ada_Indent_Renames_0'Access, +Integer (T2)))), T4 =>
(False, (Hanging_2, (Int, Ada_Indent_Broken), (Int, Ada_Indent_Broken))), T5 => (False, (Simple, (Label =>
None))), T6 => (False, (Simple, (Int, Ada_Indent_Broken)))));
end case;
end subprogram_renaming_declaration_0;
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)
is
Parse_Data : Wisi.Parse_Data_Type renames Wisi.Parse_Data_Type (User_Data);
T1 : constant SAL.Peek_Type := 1;
T2 : constant SAL.Peek_Type := 2;
T3 : constant SAL.Peek_Type := 3;
T4 : constant SAL.Peek_Type := 4;
T6 : constant SAL.Peek_Type := 5;
begin
case Parse_Data.Post_Parse_Action is
when Navigate =>
Statement_Action (Parse_Data, Tree, Nonterm, ((T1, Statement_Start), (T2, Statement_Override), (T6,
Statement_End)));
when Face =>
Face_Apply_Action (Parse_Data, Tree, Nonterm, (1 => (T4, 1, 1)));
when Indent =>
Indent_Action_0 (Parse_Data, Tree, Nonterm, (T1 => (False, (Simple, (Label => None))), T2 => (False, (Simple,
(Label => None))), T3 => (False, (Simple, (Language, Ada_Indent_Renames_0'Access, +Integer (T2)))), T4 =>
(False, (Hanging_2, (Int, Ada_Indent_Broken), (Int, Ada_Indent_Broken))), T6 => (False, (Simple, (Int,
Ada_Indent_Broken)))));
end case;
end subprogram_renaming_declaration_1;
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)
is
Parse_Data : Wisi.Parse_Data_Type renames Wisi.Parse_Data_Type (User_Data);
T2 : constant SAL.Peek_Type := 1;
T3 : constant SAL.Peek_Type := 2;
T4 : constant SAL.Peek_Type := 3;
T5 : constant SAL.Peek_Type := 4;
T6 : constant SAL.Peek_Type := 5;
begin
case Parse_Data.Post_Parse_Action is
when Navigate =>
Statement_Action (Parse_Data, Tree, Nonterm, ((T2, Statement_Override), (T6, Statement_End)));
when Face =>
Face_Apply_Action (Parse_Data, Tree, Nonterm, (1 => (T4, 1, 1)));
when Indent =>
Indent_Action_0 (Parse_Data, Tree, Nonterm, (T2 => (False, (Simple, (Label => None))), T3 => (False, (Simple,
(Language, Ada_Indent_Renames_0'Access, +Integer (T2)))), T4 => (False, (Hanging_2, (Int, Ada_Indent_Broken),
(Int, Ada_Indent_Broken))), T5 => (False, (Simple, (Label => None))), T6 => (False, (Simple, (Int,
Ada_Indent_Broken)))));
end case;
end subprogram_renaming_declaration_2;
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)
is
Parse_Data : Wisi.Parse_Data_Type renames Wisi.Parse_Data_Type (User_Data);
T2 : constant SAL.Peek_Type := 1;
T3 : constant SAL.Peek_Type := 2;
T4 : constant SAL.Peek_Type := 3;
T6 : constant SAL.Peek_Type := 4;
begin
case Parse_Data.Post_Parse_Action is
when Navigate =>
Statement_Action (Parse_Data, Tree, Nonterm, ((T2, Statement_Override), (T6, Statement_End)));
when Face =>
Face_Apply_Action (Parse_Data, Tree, Nonterm, (1 => (T4, 1, 1)));
when Indent =>
Indent_Action_0 (Parse_Data, Tree, Nonterm, (T2 => (False, (Simple, (Label => None))), T3 => (False, (Simple,
(Language, Ada_Indent_Renames_0'Access, +Integer (T2)))), T4 => (False, (Hanging_2, (Int, Ada_Indent_Broken),
(Int, Ada_Indent_Broken))), T6 => (False, (Simple, (Int, Ada_Indent_Broken)))));
end case;
end subprogram_renaming_declaration_3;
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)
is
Parse_Data : Wisi.Parse_Data_Type renames Wisi.Parse_Data_Type (User_Data);
T1 : constant SAL.Peek_Type := 1;
T2 : constant SAL.Peek_Type := 2;
T3 : constant SAL.Peek_Type := 3;
T4 : constant SAL.Peek_Type := 4;
T5 : constant SAL.Peek_Type := 5;
T6 : constant SAL.Peek_Type := 6;
T7 : constant SAL.Peek_Type := 7;
begin
case Parse_Data.Post_Parse_Action is
when Navigate =>
Statement_Action (Parse_Data, Tree, Nonterm, ((T1, Statement_Start), (T7, Statement_End)));
Name_Action (Parse_Data, Tree, Nonterm, T3);
when Face =>
Face_Apply_Action (Parse_Data, Tree, Nonterm, ((T3, 1, 1), (T5, 1, 1)));
when Indent =>
Indent_Action_0 (Parse_Data, Tree, Nonterm, (T1 => (False, (Simple, (Label => None))), T2 => (False, (Simple,
(Label => None))), T3 => (False, (Hanging_2, (Int, Ada_Indent_Broken), (Int, Ada_Indent_Broken))), T4 =>
(False, (Simple, (Int, Ada_Indent_Broken))), T5 => (False, (Hanging_2, (Int, Ada_Indent_Broken), (Int,
Ada_Indent_Broken))), T6 => (False, (Simple, (Int, Ada_Indent_Broken))), T7 => (False, (Simple, (Int,
Ada_Indent_Broken)))));
end case;
end generic_renaming_declaration_0;
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)
is
Parse_Data : Wisi.Parse_Data_Type renames Wisi.Parse_Data_Type (User_Data);
T1 : constant SAL.Peek_Type := 1;
T2 : constant SAL.Peek_Type := 2;
T3 : constant SAL.Peek_Type := 3;
T4 : constant SAL.Peek_Type := 4;
T5 : constant SAL.Peek_Type := 5;
T7 : constant SAL.Peek_Type := 6;
begin
case Parse_Data.Post_Parse_Action is
when Navigate =>
Statement_Action (Parse_Data, Tree, Nonterm, ((T1, Statement_Start), (T7, Statement_End)));
Name_Action (Parse_Data, Tree, Nonterm, T3);
when Face =>
Face_Apply_Action (Parse_Data, Tree, Nonterm, ((T3, 1, 1), (T5, 1, 1)));
when Indent =>
Indent_Action_0 (Parse_Data, Tree, Nonterm, (T1 => (False, (Simple, (Label => None))), T2 => (False, (Simple,
(Label => None))), T3 => (False, (Hanging_2, (Int, Ada_Indent_Broken), (Int, Ada_Indent_Broken))), T4 =>
(False, (Simple, (Int, Ada_Indent_Broken))), T5 => (False, (Hanging_2, (Int, Ada_Indent_Broken), (Int,
Ada_Indent_Broken))), T7 => (False, (Simple, (Int, Ada_Indent_Broken)))));
end case;
end generic_renaming_declaration_1;
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)
is
Parse_Data : Wisi.Parse_Data_Type renames Wisi.Parse_Data_Type (User_Data);
T1 : constant SAL.Peek_Type := 1;
T2 : constant SAL.Peek_Type := 2;
T3 : constant SAL.Peek_Type := 3;
T4 : constant SAL.Peek_Type := 4;
T5 : constant SAL.Peek_Type := 5;
T6 : constant SAL.Peek_Type := 6;
T7 : constant SAL.Peek_Type := 7;
begin
case Parse_Data.Post_Parse_Action is
when Navigate =>
Statement_Action (Parse_Data, Tree, Nonterm, ((T1, Statement_Start), (T7, Statement_End)));
Name_Action (Parse_Data, Tree, Nonterm, T3);
when Face =>
Face_Apply_Action (Parse_Data, Tree, Nonterm, ((T3, 1, 1), (T5, 1, 1)));
when Indent =>
Indent_Action_0 (Parse_Data, Tree, Nonterm, (T1 => (False, (Simple, (Label => None))), T2 => (False, (Simple,
(Label => None))), T3 => (False, (Hanging_2, (Int, Ada_Indent_Broken), (Int, Ada_Indent_Broken))), T4 =>
(False, (Simple, (Int, Ada_Indent_Broken))), T5 => (False, (Hanging_2, (Int, Ada_Indent_Broken), (Int,
Ada_Indent_Broken))), T6 => (False, (Simple, (Int, Ada_Indent_Broken))), T7 => (False, (Simple, (Int,
Ada_Indent_Broken)))));
end case;
end generic_renaming_declaration_2;
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)
is
Parse_Data : Wisi.Parse_Data_Type renames Wisi.Parse_Data_Type (User_Data);
T1 : constant SAL.Peek_Type := 1;
T2 : constant SAL.Peek_Type := 2;
T3 : constant SAL.Peek_Type := 3;
T4 : constant SAL.Peek_Type := 4;
T5 : constant SAL.Peek_Type := 5;
T7 : constant SAL.Peek_Type := 6;
begin
case Parse_Data.Post_Parse_Action is
when Navigate =>
Statement_Action (Parse_Data, Tree, Nonterm, ((T1, Statement_Start), (T7, Statement_End)));
Name_Action (Parse_Data, Tree, Nonterm, T3);
when Face =>
Face_Apply_Action (Parse_Data, Tree, Nonterm, ((T3, 1, 1), (T5, 1, 1)));
when Indent =>
Indent_Action_0 (Parse_Data, Tree, Nonterm, (T1 => (False, (Simple, (Label => None))), T2 => (False, (Simple,
(Label => None))), T3 => (False, (Hanging_2, (Int, Ada_Indent_Broken), (Int, Ada_Indent_Broken))), T4 =>
(False, (Simple, (Int, Ada_Indent_Broken))), T5 => (False, (Hanging_2, (Int, Ada_Indent_Broken), (Int,
Ada_Indent_Broken))), T7 => (False, (Simple, (Int, Ada_Indent_Broken)))));
end case;
end generic_renaming_declaration_3;
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)
is
Parse_Data : Wisi.Parse_Data_Type renames Wisi.Parse_Data_Type (User_Data);
T1 : constant SAL.Peek_Type := 1;
T2 : constant SAL.Peek_Type := 2;
T3 : constant SAL.Peek_Type := 3;
T4 : constant SAL.Peek_Type := 4;
T5 : constant SAL.Peek_Type := 5;
T6 : constant SAL.Peek_Type := 6;
T7 : constant SAL.Peek_Type := 7;
begin
case Parse_Data.Post_Parse_Action is
when Navigate =>
Statement_Action (Parse_Data, Tree, Nonterm, ((T1, Statement_Start), (T7, Statement_End)));
Name_Action (Parse_Data, Tree, Nonterm, T3);
when Face =>
Face_Apply_Action (Parse_Data, Tree, Nonterm, ((T3, 1, 1), (T5, 1, 1)));
when Indent =>
Indent_Action_0 (Parse_Data, Tree, Nonterm, (T1 => (False, (Simple, (Label => None))), T2 => (False, (Simple,
(Label => None))), T3 => (False, (Hanging_2, (Int, Ada_Indent_Broken), (Int, Ada_Indent_Broken))), T4 =>
(False, (Simple, (Int, Ada_Indent_Broken))), T5 => (False, (Hanging_2, (Int, Ada_Indent_Broken), (Int,
Ada_Indent_Broken))), T6 => (False, (Simple, (Int, Ada_Indent_Broken))), T7 => (False, (Simple, (Int,
Ada_Indent_Broken)))));
end case;
end generic_renaming_declaration_4;
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)
is
Parse_Data : Wisi.Parse_Data_Type renames Wisi.Parse_Data_Type (User_Data);
T1 : constant SAL.Peek_Type := 1;
T2 : constant SAL.Peek_Type := 2;
T3 : constant SAL.Peek_Type := 3;
T4 : constant SAL.Peek_Type := 4;
T5 : constant SAL.Peek_Type := 5;
T7 : constant SAL.Peek_Type := 6;
begin
case Parse_Data.Post_Parse_Action is
when Navigate =>
Statement_Action (Parse_Data, Tree, Nonterm, ((T1, Statement_Start), (T7, Statement_End)));
Name_Action (Parse_Data, Tree, Nonterm, T3);
when Face =>
Face_Apply_Action (Parse_Data, Tree, Nonterm, ((T3, 1, 1), (T5, 1, 1)));
when Indent =>
Indent_Action_0 (Parse_Data, Tree, Nonterm, (T1 => (False, (Simple, (Label => None))), T2 => (False, (Simple,
(Label => None))), T3 => (False, (Hanging_2, (Int, Ada_Indent_Broken), (Int, Ada_Indent_Broken))), T4 =>
(False, (Simple, (Int, Ada_Indent_Broken))), T5 => (False, (Hanging_2, (Int, Ada_Indent_Broken), (Int,
Ada_Indent_Broken))), T7 => (False, (Simple, (Int, Ada_Indent_Broken)))));
end case;
end generic_renaming_declaration_5;
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)
is
Parse_Data : Wisi.Parse_Data_Type renames Wisi.Parse_Data_Type (User_Data);
T1 : constant SAL.Peek_Type := 1;
T2 : constant SAL.Peek_Type := 2;
T3 : constant SAL.Peek_Type := 3;
T4 : constant SAL.Peek_Type := 4;
T5 : constant SAL.Peek_Type := 5;
T6 : constant SAL.Peek_Type := 6;
T7 : constant SAL.Peek_Type := 7;
T8 : constant SAL.Peek_Type := 8;
T9 : constant SAL.Peek_Type := 9;
T10 : constant SAL.Peek_Type := 10;
T11 : constant SAL.Peek_Type := 11;
begin
case Parse_Data.Post_Parse_Action is
when Navigate =>
Statement_Action (Parse_Data, Tree, Nonterm, ((T1, Statement_Start), (T6, Motion), (T9, Motion), (T11,
Statement_End)));
Name_Action (Parse_Data, Tree, Nonterm, T3);
Motion_Action (Parse_Data, Tree, Nonterm, (Index_ID'(T1, Invalid_Token_ID) & Index_ID'(T6, Invalid_Token_ID) &
Index_ID'(T9, Invalid_Token_ID) & Index_ID'(T10, 27) & Index_ID'(T11, Invalid_Token_ID)));
when Face =>
Face_Apply_Action (Parse_Data, Tree, Nonterm, (1 => (T3, 3, 2)));
when Indent =>
Indent_Action_0 (Parse_Data, Tree, Nonterm, (T1 => (False, (Simple, (Label => None))), T2 => (False, (Simple,
(Int, Ada_Indent_Broken))), T3 => (False, (Simple, (Int, Ada_Indent_Broken))), T4 => (False, (Simple, (Int,
Ada_Indent_Broken))), T5 => (False, (Simple, (Label => None))), T6 => (True, (Simple, (Label => None)),
(Simple, (Int, Ada_Indent))), T7 => (False, (Simple, (Int, Ada_Indent_Broken))), T8 => (False, (Simple, (Int,
Ada_Indent_Broken))), T9 => (False, (Simple, (Int, Ada_Indent_Broken))), T10 => (False, (Simple, (Label =>
None))), T11 => (False, (Simple, (Int, Ada_Indent_Broken)))));
end case;
end task_type_declaration_0;
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
is
pragma Unreferenced (Nonterm, Recover_Active);
T3 : constant SAL.Peek_Type := 3;
T10 : constant SAL.Peek_Type := 10;
begin
return Match_Names (Tree, Tokens, T3, T10, End_Names_Optional);
end task_type_declaration_0_check;
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)
is
Parse_Data : Wisi.Parse_Data_Type renames Wisi.Parse_Data_Type (User_Data);
T1 : constant SAL.Peek_Type := 1;
T2 : constant SAL.Peek_Type := 2;
T3 : constant SAL.Peek_Type := 3;
T4 : constant SAL.Peek_Type := 4;
T5 : constant SAL.Peek_Type := 5;
T6 : constant SAL.Peek_Type := 6;
T10 : constant SAL.Peek_Type := 7;
T11 : constant SAL.Peek_Type := 8;
begin
case Parse_Data.Post_Parse_Action is
when Navigate =>
Statement_Action (Parse_Data, Tree, Nonterm, ((T1, Statement_Start), (T6, Motion), (T11, Statement_End)));
Name_Action (Parse_Data, Tree, Nonterm, T3);
Motion_Action (Parse_Data, Tree, Nonterm, (Index_ID'(T1, Invalid_Token_ID) & Index_ID'(T6, Invalid_Token_ID) &
Index_ID'(T10, 27) & Index_ID'(T11, Invalid_Token_ID)));
when Face =>
Face_Apply_Action (Parse_Data, Tree, Nonterm, (1 => (T3, 3, 2)));
when Indent =>
Indent_Action_0 (Parse_Data, Tree, Nonterm, (T1 => (False, (Simple, (Label => None))), T2 => (False, (Simple,
(Int, Ada_Indent_Broken))), T3 => (False, (Simple, (Int, Ada_Indent_Broken))), T4 => (False, (Simple, (Int,
Ada_Indent_Broken))), T5 => (False, (Simple, (Label => None))), T6 => (True, (Simple, (Label => None)),
(Simple, (Int, Ada_Indent))), T10 => (False, (Simple, (Label => None))), T11 => (False, (Simple, (Int,
Ada_Indent_Broken)))));
end case;
end task_type_declaration_1;
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
is
pragma Unreferenced (Nonterm, Recover_Active);
T3 : constant SAL.Peek_Type := 3;
T10 : constant SAL.Peek_Type := 7;
begin
return Match_Names (Tree, Tokens, T3, T10, End_Names_Optional);
end task_type_declaration_1_check;
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)
is
Parse_Data : Wisi.Parse_Data_Type renames Wisi.Parse_Data_Type (User_Data);
T1 : constant SAL.Peek_Type := 1;
T2 : constant SAL.Peek_Type := 2;
T3 : constant SAL.Peek_Type := 3;
T4 : constant SAL.Peek_Type := 4;
T5 : constant SAL.Peek_Type := 5;
T11 : constant SAL.Peek_Type := 6;
begin
case Parse_Data.Post_Parse_Action is
when Navigate =>
Statement_Action (Parse_Data, Tree, Nonterm, ((T1, Statement_Start), (T11, Statement_End)));
Name_Action (Parse_Data, Tree, Nonterm, T3);
Motion_Action (Parse_Data, Tree, Nonterm, (Index_ID'(T1, Invalid_Token_ID) & Index_ID'(T11,
Invalid_Token_ID)));
when Face =>
Face_Apply_Action (Parse_Data, Tree, Nonterm, (1 => (T3, 3, 2)));
when Indent =>
Indent_Action_0 (Parse_Data, Tree, Nonterm, (T1 => (False, (Simple, (Label => None))), T2 => (False, (Simple,
(Int, Ada_Indent_Broken))), T3 => (False, (Simple, (Int, Ada_Indent_Broken))), T4 => (False, (Simple, (Int,
Ada_Indent_Broken))), T5 => (False, (Simple, (Label => None))), T11 => (False, (Simple, (Int,
Ada_Indent_Broken)))));
end case;
end task_type_declaration_2;
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)
is
Parse_Data : Wisi.Parse_Data_Type renames Wisi.Parse_Data_Type (User_Data);
T1 : constant SAL.Peek_Type := 1;
T2 : constant SAL.Peek_Type := 2;
T3 : constant SAL.Peek_Type := 3;
T4 : constant SAL.Peek_Type := 4;
T6 : constant SAL.Peek_Type := 5;
T7 : constant SAL.Peek_Type := 6;
T8 : constant SAL.Peek_Type := 7;
T9 : constant SAL.Peek_Type := 8;
T10 : constant SAL.Peek_Type := 9;
T11 : constant SAL.Peek_Type := 10;
begin
case Parse_Data.Post_Parse_Action is
when Navigate =>
Statement_Action (Parse_Data, Tree, Nonterm, ((T1, Statement_Start), (T6, Motion), (T9, Motion), (T11,
Statement_End)));
Name_Action (Parse_Data, Tree, Nonterm, T3);
Motion_Action (Parse_Data, Tree, Nonterm, (Index_ID'(T1, Invalid_Token_ID) & Index_ID'(T6, Invalid_Token_ID) &
Index_ID'(T9, Invalid_Token_ID) & Index_ID'(T10, 27) & Index_ID'(T11, Invalid_Token_ID)));
when Face =>
Face_Apply_Action (Parse_Data, Tree, Nonterm, (1 => (T3, 3, 2)));
when Indent =>
Indent_Action_0 (Parse_Data, Tree, Nonterm, (T1 => (False, (Simple, (Label => None))), T2 => (False, (Simple,
(Int, Ada_Indent_Broken))), T3 => (False, (Simple, (Int, Ada_Indent_Broken))), T4 => (False, (Simple, (Int,
Ada_Indent_Broken))), T6 => (True, (Simple, (Label => None)), (Simple, (Int, Ada_Indent))), T7 => (False,
(Simple, (Int, Ada_Indent_Broken))), T8 => (False, (Simple, (Int, Ada_Indent_Broken))), T9 => (False, (Simple,
(Int, Ada_Indent_Broken))), T10 => (False, (Simple, (Label => None))), T11 => (False, (Simple, (Int,
Ada_Indent_Broken)))));
end case;
end task_type_declaration_3;
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
is
pragma Unreferenced (Nonterm, Recover_Active);
T3 : constant SAL.Peek_Type := 3;
T10 : constant SAL.Peek_Type := 9;
begin
return Match_Names (Tree, Tokens, T3, T10, End_Names_Optional);
end task_type_declaration_3_check;
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)
is
Parse_Data : Wisi.Parse_Data_Type renames Wisi.Parse_Data_Type (User_Data);
T1 : constant SAL.Peek_Type := 1;
T2 : constant SAL.Peek_Type := 2;
T3 : constant SAL.Peek_Type := 3;
T4 : constant SAL.Peek_Type := 4;
T6 : constant SAL.Peek_Type := 5;
T10 : constant SAL.Peek_Type := 6;
T11 : constant SAL.Peek_Type := 7;
begin
case Parse_Data.Post_Parse_Action is
when Navigate =>
Statement_Action (Parse_Data, Tree, Nonterm, ((T1, Statement_Start), (T6, Motion), (T11, Statement_End)));
Name_Action (Parse_Data, Tree, Nonterm, T3);
Motion_Action (Parse_Data, Tree, Nonterm, (Index_ID'(T1, Invalid_Token_ID) & Index_ID'(T6, Invalid_Token_ID) &
Index_ID'(T10, 27) & Index_ID'(T11, Invalid_Token_ID)));
when Face =>
Face_Apply_Action (Parse_Data, Tree, Nonterm, (1 => (T3, 3, 2)));
when Indent =>
Indent_Action_0 (Parse_Data, Tree, Nonterm, (T1 => (False, (Simple, (Label => None))), T2 => (False, (Simple,
(Int, Ada_Indent_Broken))), T3 => (False, (Simple, (Int, Ada_Indent_Broken))), T4 => (False, (Simple, (Int,
Ada_Indent_Broken))), T6 => (True, (Simple, (Label => None)), (Simple, (Int, Ada_Indent))), T10 => (False,
(Simple, (Label => None))), T11 => (False, (Simple, (Int, Ada_Indent_Broken)))));
end case;
end task_type_declaration_4;
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
is
pragma Unreferenced (Nonterm, Recover_Active);
T3 : constant SAL.Peek_Type := 3;
T10 : constant SAL.Peek_Type := 6;
begin
return Match_Names (Tree, Tokens, T3, T10, End_Names_Optional);
end task_type_declaration_4_check;
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)
is
Parse_Data : Wisi.Parse_Data_Type renames Wisi.Parse_Data_Type (User_Data);
T1 : constant SAL.Peek_Type := 1;
T2 : constant SAL.Peek_Type := 2;
T3 : constant SAL.Peek_Type := 3;
T4 : constant SAL.Peek_Type := 4;
T11 : constant SAL.Peek_Type := 5;
begin
case Parse_Data.Post_Parse_Action is
when Navigate =>
Statement_Action (Parse_Data, Tree, Nonterm, ((T1, Statement_Start), (T11, Statement_End)));
Name_Action (Parse_Data, Tree, Nonterm, T3);
Motion_Action (Parse_Data, Tree, Nonterm, (Index_ID'(T1, Invalid_Token_ID) & Index_ID'(T11,
Invalid_Token_ID)));
when Face =>
Face_Apply_Action (Parse_Data, Tree, Nonterm, (1 => (T3, 3, 2)));
when Indent =>
Indent_Action_0 (Parse_Data, Tree, Nonterm, (T1 => (False, (Simple, (Label => None))), T2 => (False, (Simple,
(Int, Ada_Indent_Broken))), T3 => (False, (Simple, (Int, Ada_Indent_Broken))), T4 => (False, (Simple, (Int,
Ada_Indent_Broken))), T11 => (False, (Simple, (Int, Ada_Indent_Broken)))));
end case;
end task_type_declaration_5;
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)
is
Parse_Data : Wisi.Parse_Data_Type renames Wisi.Parse_Data_Type (User_Data);
T1 : constant SAL.Peek_Type := 1;
T2 : constant SAL.Peek_Type := 2;
T3 : constant SAL.Peek_Type := 3;
T5 : constant SAL.Peek_Type := 4;
T6 : constant SAL.Peek_Type := 5;
T7 : constant SAL.Peek_Type := 6;
T8 : constant SAL.Peek_Type := 7;
T9 : constant SAL.Peek_Type := 8;
T10 : constant SAL.Peek_Type := 9;
T11 : constant SAL.Peek_Type := 10;
begin
case Parse_Data.Post_Parse_Action is
when Navigate =>
Statement_Action (Parse_Data, Tree, Nonterm, ((T1, Statement_Start), (T6, Motion), (T9, Motion), (T11,
Statement_End)));
Name_Action (Parse_Data, Tree, Nonterm, T3);
Motion_Action (Parse_Data, Tree, Nonterm, (Index_ID'(T1, Invalid_Token_ID) & Index_ID'(T6, Invalid_Token_ID) &
Index_ID'(T9, Invalid_Token_ID) & Index_ID'(T10, 27) & Index_ID'(T11, Invalid_Token_ID)));
when Face =>
Face_Apply_Action (Parse_Data, Tree, Nonterm, (1 => (T3, 3, 2)));
when Indent =>
Indent_Action_0 (Parse_Data, Tree, Nonterm, (T1 => (False, (Simple, (Label => None))), T2 => (False, (Simple,
(Int, Ada_Indent_Broken))), T3 => (False, (Simple, (Int, Ada_Indent_Broken))), T5 => (False, (Simple, (Label
=> None))), T6 => (True, (Simple, (Label => None)), (Simple, (Int, Ada_Indent))), T7 => (False, (Simple, (Int,
Ada_Indent_Broken))), T8 => (False, (Simple, (Int, Ada_Indent_Broken))), T9 => (False, (Simple, (Int,
Ada_Indent_Broken))), T10 => (False, (Simple, (Label => None))), T11 => (False, (Simple, (Int,
Ada_Indent_Broken)))));
end case;
end task_type_declaration_6;
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
is
pragma Unreferenced (Nonterm, Recover_Active);
T3 : constant SAL.Peek_Type := 3;
T10 : constant SAL.Peek_Type := 9;
begin
return Match_Names (Tree, Tokens, T3, T10, End_Names_Optional);
end task_type_declaration_6_check;
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)
is
Parse_Data : Wisi.Parse_Data_Type renames Wisi.Parse_Data_Type (User_Data);
T1 : constant SAL.Peek_Type := 1;
T2 : constant SAL.Peek_Type := 2;
T3 : constant SAL.Peek_Type := 3;
T5 : constant SAL.Peek_Type := 4;
T6 : constant SAL.Peek_Type := 5;
T10 : constant SAL.Peek_Type := 6;
T11 : constant SAL.Peek_Type := 7;
begin
case Parse_Data.Post_Parse_Action is
when Navigate =>
Statement_Action (Parse_Data, Tree, Nonterm, ((T1, Statement_Start), (T6, Motion), (T11, Statement_End)));
Name_Action (Parse_Data, Tree, Nonterm, T3);
Motion_Action (Parse_Data, Tree, Nonterm, (Index_ID'(T1, Invalid_Token_ID) & Index_ID'(T6, Invalid_Token_ID) &
Index_ID'(T10, 27) & Index_ID'(T11, Invalid_Token_ID)));
when Face =>
Face_Apply_Action (Parse_Data, Tree, Nonterm, (1 => (T3, 3, 2)));
when Indent =>
Indent_Action_0 (Parse_Data, Tree, Nonterm, (T1 => (False, (Simple, (Label => None))), T2 => (False, (Simple,
(Int, Ada_Indent_Broken))), T3 => (False, (Simple, (Int, Ada_Indent_Broken))), T5 => (False, (Simple, (Label
=> None))), T6 => (True, (Simple, (Label => None)), (Simple, (Int, Ada_Indent))), T10 => (False, (Simple,
(Label => None))), T11 => (False, (Simple, (Int, Ada_Indent_Broken)))));
end case;
end task_type_declaration_7;
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
is
pragma Unreferenced (Nonterm, Recover_Active);
T3 : constant SAL.Peek_Type := 3;
T10 : constant SAL.Peek_Type := 6;
begin
return Match_Names (Tree, Tokens, T3, T10, End_Names_Optional);
end task_type_declaration_7_check;
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)
is
Parse_Data : Wisi.Parse_Data_Type renames Wisi.Parse_Data_Type (User_Data);
T1 : constant SAL.Peek_Type := 1;
T2 : constant SAL.Peek_Type := 2;
T3 : constant SAL.Peek_Type := 3;
T5 : constant SAL.Peek_Type := 4;
T11 : constant SAL.Peek_Type := 5;
begin
case Parse_Data.Post_Parse_Action is
when Navigate =>
Statement_Action (Parse_Data, Tree, Nonterm, ((T1, Statement_Start), (T11, Statement_End)));
Name_Action (Parse_Data, Tree, Nonterm, T3);
Motion_Action (Parse_Data, Tree, Nonterm, (Index_ID'(T1, Invalid_Token_ID) & Index_ID'(T11,
Invalid_Token_ID)));
when Face =>
Face_Apply_Action (Parse_Data, Tree, Nonterm, (1 => (T3, 3, 2)));
when Indent =>
Indent_Action_0 (Parse_Data, Tree, Nonterm, (T1 => (False, (Simple, (Label => None))), T2 => (False, (Simple,
(Int, Ada_Indent_Broken))), T3 => (False, (Simple, (Int, Ada_Indent_Broken))), T5 => (False, (Simple, (Label
=> None))), T11 => (False, (Simple, (Int, Ada_Indent_Broken)))));
end case;
end task_type_declaration_8;
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)
is
Parse_Data : Wisi.Parse_Data_Type renames Wisi.Parse_Data_Type (User_Data);
T1 : constant SAL.Peek_Type := 1;
T2 : constant SAL.Peek_Type := 2;
T3 : constant SAL.Peek_Type := 3;
T6 : constant SAL.Peek_Type := 4;
T7 : constant SAL.Peek_Type := 5;
T8 : constant SAL.Peek_Type := 6;
T9 : constant SAL.Peek_Type := 7;
T10 : constant SAL.Peek_Type := 8;
T11 : constant SAL.Peek_Type := 9;
begin
case Parse_Data.Post_Parse_Action is
when Navigate =>
Statement_Action (Parse_Data, Tree, Nonterm, ((T1, Statement_Start), (T6, Motion), (T9, Motion), (T11,
Statement_End)));
Name_Action (Parse_Data, Tree, Nonterm, T3);
Motion_Action (Parse_Data, Tree, Nonterm, (Index_ID'(T1, Invalid_Token_ID) & Index_ID'(T6, Invalid_Token_ID) &
Index_ID'(T9, Invalid_Token_ID) & Index_ID'(T10, 27) & Index_ID'(T11, Invalid_Token_ID)));
when Face =>
Face_Apply_Action (Parse_Data, Tree, Nonterm, (1 => (T3, 3, 2)));
when Indent =>
Indent_Action_0 (Parse_Data, Tree, Nonterm, (T1 => (False, (Simple, (Label => None))), T2 => (False, (Simple,
(Int, Ada_Indent_Broken))), T3 => (False, (Simple, (Int, Ada_Indent_Broken))), T6 => (True, (Simple, (Label =>
None)), (Simple, (Int, Ada_Indent))), T7 => (False, (Simple, (Int, Ada_Indent_Broken))), T8 => (False,
(Simple, (Int, Ada_Indent_Broken))), T9 => (False, (Simple, (Int, Ada_Indent_Broken))), T10 => (False,
(Simple, (Label => None))), T11 => (False, (Simple, (Int, Ada_Indent_Broken)))));
end case;
end task_type_declaration_9;
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
is
pragma Unreferenced (Nonterm, Recover_Active);
T3 : constant SAL.Peek_Type := 3;
T10 : constant SAL.Peek_Type := 8;
begin
return Match_Names (Tree, Tokens, T3, T10, End_Names_Optional);
end task_type_declaration_9_check;
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)
is
Parse_Data : Wisi.Parse_Data_Type renames Wisi.Parse_Data_Type (User_Data);
T1 : constant SAL.Peek_Type := 1;
T2 : constant SAL.Peek_Type := 2;
T3 : constant SAL.Peek_Type := 3;
T6 : constant SAL.Peek_Type := 4;
T10 : constant SAL.Peek_Type := 5;
T11 : constant SAL.Peek_Type := 6;
begin
case Parse_Data.Post_Parse_Action is
when Navigate =>
Statement_Action (Parse_Data, Tree, Nonterm, ((T1, Statement_Start), (T6, Motion), (T11, Statement_End)));
Name_Action (Parse_Data, Tree, Nonterm, T3);
Motion_Action (Parse_Data, Tree, Nonterm, (Index_ID'(T1, Invalid_Token_ID) & Index_ID'(T6, Invalid_Token_ID) &
Index_ID'(T10, 27) & Index_ID'(T11, Invalid_Token_ID)));
when Face =>
Face_Apply_Action (Parse_Data, Tree, Nonterm, (1 => (T3, 3, 2)));
when Indent =>
Indent_Action_0 (Parse_Data, Tree, Nonterm, (T1 => (False, (Simple, (Label => None))), T2 => (False, (Simple,
(Int, Ada_Indent_Broken))), T3 => (False, (Simple, (Int, Ada_Indent_Broken))), T6 => (True, (Simple, (Label =>
None)), (Simple, (Int, Ada_Indent))), T10 => (False, (Simple, (Label => None))), T11 => (False, (Simple, (Int,
Ada_Indent_Broken)))));
end case;
end task_type_declaration_10;
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
is
pragma Unreferenced (Nonterm, Recover_Active);
T3 : constant SAL.Peek_Type := 3;
T10 : constant SAL.Peek_Type := 5;
begin
return Match_Names (Tree, Tokens, T3, T10, End_Names_Optional);
end task_type_declaration_10_check;
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)
is
Parse_Data : Wisi.Parse_Data_Type renames Wisi.Parse_Data_Type (User_Data);
T1 : constant SAL.Peek_Type := 1;
T2 : constant SAL.Peek_Type := 2;
T3 : constant SAL.Peek_Type := 3;
T11 : constant SAL.Peek_Type := 4;
begin
case Parse_Data.Post_Parse_Action is
when Navigate =>
Statement_Action (Parse_Data, Tree, Nonterm, ((T1, Statement_Start), (T11, Statement_End)));
Name_Action (Parse_Data, Tree, Nonterm, T3);
Motion_Action (Parse_Data, Tree, Nonterm, (Index_ID'(T1, Invalid_Token_ID) & Index_ID'(T11,
Invalid_Token_ID)));
when Face =>
Face_Apply_Action (Parse_Data, Tree, Nonterm, (1 => (T3, 3, 2)));
when Indent =>
Indent_Action_0 (Parse_Data, Tree, Nonterm, (T1 => (False, (Simple, (Label => None))), T2 => (False, (Simple,
(Int, Ada_Indent_Broken))), T3 => (False, (Simple, (Int, Ada_Indent_Broken))), T11 => (False, (Simple, (Int,
Ada_Indent_Broken)))));
end case;
end task_type_declaration_11;
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)
is
Parse_Data : Wisi.Parse_Data_Type renames Wisi.Parse_Data_Type (User_Data);
T1 : constant SAL.Peek_Type := 1;
T2 : constant SAL.Peek_Type := 2;
T3 : constant SAL.Peek_Type := 3;
T4 : constant SAL.Peek_Type := 4;
T5 : constant SAL.Peek_Type := 5;
T6 : constant SAL.Peek_Type := 6;
T7 : constant SAL.Peek_Type := 7;
T8 : constant SAL.Peek_Type := 8;
T9 : constant SAL.Peek_Type := 9;
begin
case Parse_Data.Post_Parse_Action is
when Navigate =>
Statement_Action (Parse_Data, Tree, Nonterm, ((T1, Statement_Start), (T4, Motion), (T9, Statement_End)));
Name_Action (Parse_Data, Tree, Nonterm, T2);
Motion_Action (Parse_Data, Tree, Nonterm, (Index_ID'(T1, Invalid_Token_ID) & Index_ID'(T4, Invalid_Token_ID) &
Index_ID'(T8, 27)));
when Face =>
Face_Apply_Action (Parse_Data, Tree, Nonterm, (1 => (T2, 3, 2)));
when Indent =>
Indent_Action_0 (Parse_Data, Tree, Nonterm, (T1 => (False, (Simple, (Label => None))), T2 => (False, (Simple,
(Int, Ada_Indent_Broken))), T3 => (False, (Simple, (Label => None))), T4 => (True, (Simple, (Label => None)),
(Simple, (Int, Ada_Indent))), T5 => (False, (Simple, (Int, Ada_Indent_Broken))), T6 => (False, (Simple, (Int,
Ada_Indent_Broken))), T7 => (False, (Simple, (Int, Ada_Indent_Broken))), T8 => (False, (Simple, (Label =>
None))), T9 => (False, (Simple, (Int, Ada_Indent_Broken)))));
end case;
end single_task_declaration_0;
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
is
pragma Unreferenced (Nonterm, Recover_Active);
T2 : constant SAL.Peek_Type := 2;
T8 : constant SAL.Peek_Type := 8;
begin
return Match_Names (Tree, Tokens, T2, T8, End_Names_Optional);
end single_task_declaration_0_check;
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)
is
Parse_Data : Wisi.Parse_Data_Type renames Wisi.Parse_Data_Type (User_Data);
T1 : constant SAL.Peek_Type := 1;
T2 : constant SAL.Peek_Type := 2;
T3 : constant SAL.Peek_Type := 3;
T4 : constant SAL.Peek_Type := 4;
T8 : constant SAL.Peek_Type := 5;
T9 : constant SAL.Peek_Type := 6;
begin
case Parse_Data.Post_Parse_Action is
when Navigate =>
Statement_Action (Parse_Data, Tree, Nonterm, ((T1, Statement_Start), (T4, Motion), (T9, Statement_End)));
Name_Action (Parse_Data, Tree, Nonterm, T2);
Motion_Action (Parse_Data, Tree, Nonterm, (Index_ID'(T1, Invalid_Token_ID) & Index_ID'(T4, Invalid_Token_ID) &
Index_ID'(T8, 27)));
when Face =>
Face_Apply_Action (Parse_Data, Tree, Nonterm, (1 => (T2, 3, 2)));
when Indent =>
Indent_Action_0 (Parse_Data, Tree, Nonterm, (T1 => (False, (Simple, (Label => None))), T2 => (False, (Simple,
(Int, Ada_Indent_Broken))), T3 => (False, (Simple, (Label => None))), T4 => (True, (Simple, (Label => None)),
(Simple, (Int, Ada_Indent))), T8 => (False, (Simple, (Label => None))), T9 => (False, (Simple, (Int,
Ada_Indent_Broken)))));
end case;
end single_task_declaration_1;
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
is
pragma Unreferenced (Nonterm, Recover_Active);
T2 : constant SAL.Peek_Type := 2;
T8 : constant SAL.Peek_Type := 5;
begin
return Match_Names (Tree, Tokens, T2, T8, End_Names_Optional);
end single_task_declaration_1_check;
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)
is
Parse_Data : Wisi.Parse_Data_Type renames Wisi.Parse_Data_Type (User_Data);
T1 : constant SAL.Peek_Type := 1;
T2 : constant SAL.Peek_Type := 2;
T3 : constant SAL.Peek_Type := 3;
T9 : constant SAL.Peek_Type := 4;
begin
case Parse_Data.Post_Parse_Action is
when Navigate =>
Statement_Action (Parse_Data, Tree, Nonterm, ((T1, Statement_Start), (T9, Statement_End)));
Name_Action (Parse_Data, Tree, Nonterm, T2);
when Face =>
Face_Apply_Action (Parse_Data, Tree, Nonterm, (1 => (T2, 3, 2)));
when Indent =>
Indent_Action_0 (Parse_Data, Tree, Nonterm, (T1 => (False, (Simple, (Label => None))), T2 => (False, (Simple,
(Int, Ada_Indent_Broken))), T3 => (False, (Simple, (Label => None))), T9 => (False, (Simple, (Int,
Ada_Indent_Broken)))));
end case;
end single_task_declaration_2;
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)
is
Parse_Data : Wisi.Parse_Data_Type renames Wisi.Parse_Data_Type (User_Data);
T1 : constant SAL.Peek_Type := 1;
T2 : constant SAL.Peek_Type := 2;
T4 : constant SAL.Peek_Type := 3;
T5 : constant SAL.Peek_Type := 4;
T6 : constant SAL.Peek_Type := 5;
T7 : constant SAL.Peek_Type := 6;
T8 : constant SAL.Peek_Type := 7;
T9 : constant SAL.Peek_Type := 8;
begin
case Parse_Data.Post_Parse_Action is
when Navigate =>
Statement_Action (Parse_Data, Tree, Nonterm, ((T1, Statement_Start), (T4, Motion), (T9, Statement_End)));
Name_Action (Parse_Data, Tree, Nonterm, T2);
Motion_Action (Parse_Data, Tree, Nonterm, (Index_ID'(T1, Invalid_Token_ID) & Index_ID'(T4, Invalid_Token_ID) &
Index_ID'(T8, 27)));
when Face =>
Face_Apply_Action (Parse_Data, Tree, Nonterm, (1 => (T2, 3, 2)));
when Indent =>
Indent_Action_0 (Parse_Data, Tree, Nonterm, (T1 => (False, (Simple, (Label => None))), T2 => (False, (Simple,
(Int, Ada_Indent_Broken))), T4 => (True, (Simple, (Label => None)), (Simple, (Int, Ada_Indent))), T5 =>
(False, (Simple, (Int, Ada_Indent_Broken))), T6 => (False, (Simple, (Int, Ada_Indent_Broken))), T7 => (False,
(Simple, (Int, Ada_Indent_Broken))), T8 => (False, (Simple, (Label => None))), T9 => (False, (Simple, (Int,
Ada_Indent_Broken)))));
end case;
end single_task_declaration_3;
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
is
pragma Unreferenced (Nonterm, Recover_Active);
T2 : constant SAL.Peek_Type := 2;
T8 : constant SAL.Peek_Type := 7;
begin
return Match_Names (Tree, Tokens, T2, T8, End_Names_Optional);
end single_task_declaration_3_check;
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)
is
Parse_Data : Wisi.Parse_Data_Type renames Wisi.Parse_Data_Type (User_Data);
T1 : constant SAL.Peek_Type := 1;
T2 : constant SAL.Peek_Type := 2;
T4 : constant SAL.Peek_Type := 3;
T8 : constant SAL.Peek_Type := 4;
T9 : constant SAL.Peek_Type := 5;
begin
case Parse_Data.Post_Parse_Action is
when Navigate =>
Statement_Action (Parse_Data, Tree, Nonterm, ((T1, Statement_Start), (T4, Motion), (T9, Statement_End)));
Name_Action (Parse_Data, Tree, Nonterm, T2);
Motion_Action (Parse_Data, Tree, Nonterm, (Index_ID'(T1, Invalid_Token_ID) & Index_ID'(T4, Invalid_Token_ID) &
Index_ID'(T8, 27)));
when Face =>
Face_Apply_Action (Parse_Data, Tree, Nonterm, (1 => (T2, 3, 2)));
when Indent =>
Indent_Action_0 (Parse_Data, Tree, Nonterm, (T1 => (False, (Simple, (Label => None))), T2 => (False, (Simple,
(Int, Ada_Indent_Broken))), T4 => (True, (Simple, (Label => None)), (Simple, (Int, Ada_Indent))), T8 =>
(False, (Simple, (Label => None))), T9 => (False, (Simple, (Int, Ada_Indent_Broken)))));
end case;
end single_task_declaration_4;
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
is
pragma Unreferenced (Nonterm, Recover_Active);
T2 : constant SAL.Peek_Type := 2;
T8 : constant SAL.Peek_Type := 4;
begin
return Match_Names (Tree, Tokens, T2, T8, End_Names_Optional);
end single_task_declaration_4_check;
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)
is
Parse_Data : Wisi.Parse_Data_Type renames Wisi.Parse_Data_Type (User_Data);
T1 : constant SAL.Peek_Type := 1;
T2 : constant SAL.Peek_Type := 2;
T9 : constant SAL.Peek_Type := 3;
begin
case Parse_Data.Post_Parse_Action is
when Navigate =>
Statement_Action (Parse_Data, Tree, Nonterm, ((T1, Statement_Start), (T9, Statement_End)));
Name_Action (Parse_Data, Tree, Nonterm, T2);
when Face =>
Face_Apply_Action (Parse_Data, Tree, Nonterm, (1 => (T2, 3, 2)));
when Indent =>
Indent_Action_0 (Parse_Data, Tree, Nonterm, (T1 => (False, (Simple, (Label => None))), T2 => (False, (Simple,
(Int, Ada_Indent_Broken))), T9 => (False, (Simple, (Int, Ada_Indent_Broken)))));
end case;
end single_task_declaration_5;
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)
is
Parse_Data : Wisi.Parse_Data_Type renames Wisi.Parse_Data_Type (User_Data);
T1 : constant SAL.Peek_Type := 1;
T2 : constant SAL.Peek_Type := 2;
T3 : constant SAL.Peek_Type := 3;
T4 : constant SAL.Peek_Type := 4;
T5 : constant SAL.Peek_Type := 5;
begin
case Parse_Data.Post_Parse_Action is
when Navigate =>
Statement_Action (Parse_Data, Tree, Nonterm, (1 => (T2, Motion)));
when Face =>
Face_Apply_Action (Parse_Data, Tree, Nonterm, (1 => (T5, 3, 2)));
when Indent =>
Indent_Action_0 (Parse_Data, Tree, Nonterm, (T1 => (True, (Simple, (Int, Ada_Indent)), (Simple, (Int,
Ada_Indent))), T2 => (False, (Simple, (Label => None))), T3 => (True, (Simple, (Int, Ada_Indent)), (Simple,
(Int, Ada_Indent))), T4 => (False, (Simple, (Label => None))), T5 => (False, (Simple, (Int,
Ada_Indent_Broken)))));
end case;
end task_definition_0;
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
is
pragma Unreferenced (Recover_Active);
T5 : constant SAL.Peek_Type := 5;
begin
return Propagate_Name (Tree, Nonterm, Tokens, T5);
end task_definition_0_check;
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)
is
Parse_Data : Wisi.Parse_Data_Type renames Wisi.Parse_Data_Type (User_Data);
T1 : constant SAL.Peek_Type := 1;
T4 : constant SAL.Peek_Type := 2;
T5 : constant SAL.Peek_Type := 3;
begin
case Parse_Data.Post_Parse_Action is
when Navigate =>
Statement_Action (Parse_Data, Tree, Nonterm, (1 .. 0 => (1, Motion)));
when Face =>
Face_Apply_Action (Parse_Data, Tree, Nonterm, (1 => (T5, 3, 2)));
when Indent =>
Indent_Action_0 (Parse_Data, Tree, Nonterm, (T1 => (True, (Simple, (Int, Ada_Indent)), (Simple, (Int,
Ada_Indent))), T4 => (False, (Simple, (Label => None))), T5 => (False, (Simple, (Int, Ada_Indent_Broken)))));
end case;
end task_definition_1;
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
is
pragma Unreferenced (Recover_Active);
T5 : constant SAL.Peek_Type := 3;
begin
return Propagate_Name (Tree, Nonterm, Tokens, T5);
end task_definition_1_check;
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)
is
Parse_Data : Wisi.Parse_Data_Type renames Wisi.Parse_Data_Type (User_Data);
T1 : constant SAL.Peek_Type := 1;
T2 : constant SAL.Peek_Type := 2;
T3 : constant SAL.Peek_Type := 3;
T4 : constant SAL.Peek_Type := 4;
T5 : constant SAL.Peek_Type := 5;
T6 : constant SAL.Peek_Type := 6;
T7 : constant SAL.Peek_Type := 7;
T8 : constant SAL.Peek_Type := 8;
T9 : constant SAL.Peek_Type := 9;
T10 : constant SAL.Peek_Type := 10;
T11 : constant SAL.Peek_Type := 11;
begin
case Parse_Data.Post_Parse_Action is
when Navigate =>
Statement_Action (Parse_Data, Tree, Nonterm, ((T1, Statement_Start), (T5, Motion), (T7, Motion), (T11,
Statement_End)));
Name_Action (Parse_Data, Tree, Nonterm, T3);
Motion_Action (Parse_Data, Tree, Nonterm, (Index_ID'(T1, Invalid_Token_ID) & Index_ID'(T5, Invalid_Token_ID) &
Index_ID'(T7, Invalid_Token_ID) & Index_ID'(T8, 63) & Index_ID'(T11, Invalid_Token_ID)));
when Face =>
Face_Apply_Action (Parse_Data, Tree, Nonterm, ((T3, 3, 2), (T10, 3, 2)));
when Indent =>
Indent_Action_0 (Parse_Data, Tree, Nonterm, (T1 => (False, (Simple, (Label => None))), T2 => (False, (Simple,
(Label => None))), T3 => (False, (Simple, (Int, Ada_Indent_Broken))), T4 => (False, (Simple, (Label =>
None))), T5 => (False, (Simple, (Label => None))), T6 => (True, (Simple, (Block, Ada_Indent)), (Simple, (Int,
Ada_Indent))), T7 => (False, (Simple, (Label => None))), T8 => (True, (Simple, (Block, Ada_Indent)), (Simple,
(Int, Ada_Indent))), T9 => (False, (Simple, (Label => None))), T10 => (False, (Simple, (Int,
Ada_Indent_Broken))), T11 => (False, (Simple, (Int, Ada_Indent_Broken)))));
end case;
end task_body_0;
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
is
pragma Unreferenced (Nonterm, Recover_Active);
T3 : constant SAL.Peek_Type := 3;
T10 : constant SAL.Peek_Type := 10;
begin
return Match_Names (Tree, Tokens, T3, T10, End_Names_Optional);
end task_body_0_check;
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)
is
Parse_Data : Wisi.Parse_Data_Type renames Wisi.Parse_Data_Type (User_Data);
T1 : constant SAL.Peek_Type := 1;
T2 : constant SAL.Peek_Type := 2;
T3 : constant SAL.Peek_Type := 3;
T5 : constant SAL.Peek_Type := 4;
T6 : constant SAL.Peek_Type := 5;
T7 : constant SAL.Peek_Type := 6;
T8 : constant SAL.Peek_Type := 7;
T9 : constant SAL.Peek_Type := 8;
T10 : constant SAL.Peek_Type := 9;
T11 : constant SAL.Peek_Type := 10;
begin
case Parse_Data.Post_Parse_Action is
when Navigate =>
Statement_Action (Parse_Data, Tree, Nonterm, ((T1, Statement_Start), (T5, Motion), (T7, Motion), (T11,
Statement_End)));
Name_Action (Parse_Data, Tree, Nonterm, T3);
Motion_Action (Parse_Data, Tree, Nonterm, (Index_ID'(T1, Invalid_Token_ID) & Index_ID'(T5, Invalid_Token_ID) &
Index_ID'(T7, Invalid_Token_ID) & Index_ID'(T8, 63) & Index_ID'(T11, Invalid_Token_ID)));
when Face =>
Face_Apply_Action (Parse_Data, Tree, Nonterm, ((T3, 3, 2), (T10, 3, 2)));
when Indent =>
Indent_Action_0 (Parse_Data, Tree, Nonterm, (T1 => (False, (Simple, (Label => None))), T2 => (False, (Simple,
(Label => None))), T3 => (False, (Simple, (Int, Ada_Indent_Broken))), T5 => (False, (Simple, (Label =>
None))), T6 => (True, (Simple, (Block, Ada_Indent)), (Simple, (Int, Ada_Indent))), T7 => (False, (Simple,
(Label => None))), T8 => (True, (Simple, (Block, Ada_Indent)), (Simple, (Int, Ada_Indent))), T9 => (False,
(Simple, (Label => None))), T10 => (False, (Simple, (Int, Ada_Indent_Broken))), T11 => (False, (Simple, (Int,
Ada_Indent_Broken)))));
end case;
end task_body_1;
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
is
pragma Unreferenced (Nonterm, Recover_Active);
T3 : constant SAL.Peek_Type := 3;
T10 : constant SAL.Peek_Type := 9;
begin
return Match_Names (Tree, Tokens, T3, T10, End_Names_Optional);
end task_body_1_check;
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)
is
Parse_Data : Wisi.Parse_Data_Type renames Wisi.Parse_Data_Type (User_Data);
T1 : constant SAL.Peek_Type := 1;
T2 : constant SAL.Peek_Type := 2;
T3 : constant SAL.Peek_Type := 3;
T4 : constant SAL.Peek_Type := 4;
T5 : constant SAL.Peek_Type := 5;
T6 : constant SAL.Peek_Type := 6;
T7 : constant SAL.Peek_Type := 7;
T8 : constant SAL.Peek_Type := 8;
T9 : constant SAL.Peek_Type := 9;
T10 : constant SAL.Peek_Type := 10;
T11 : constant SAL.Peek_Type := 11;
begin
case Parse_Data.Post_Parse_Action is
when Navigate =>
Statement_Action (Parse_Data, Tree, Nonterm, ((T1, Statement_Start), (T6, Motion), (T11, Statement_End)));
Name_Action (Parse_Data, Tree, Nonterm, T3);
Motion_Action (Parse_Data, Tree, Nonterm, (Index_ID'(T1, Invalid_Token_ID) & Index_ID'(T6, Invalid_Token_ID) &
Index_ID'(T10, 27) & Index_ID'(T11, Invalid_Token_ID)));
when Face =>
Face_Apply_Action (Parse_Data, Tree, Nonterm, (1 => (T3, 3, 2)));
when Indent =>
Indent_Action_0 (Parse_Data, Tree, Nonterm, (T1 => (False, (Simple, (Label => None))), T2 => (False, (Simple,
(Int, Ada_Indent_Broken))), T3 => (False, (Simple, (Int, Ada_Indent_Broken))), T4 => (False, (Simple, (Int,
Ada_Indent_Broken))), T5 => (False, (Simple, (Label => None))), T6 => (True, (Simple, (Label => None)),
(Simple, (Int, Ada_Indent))), T7 => (False, (Simple, (Int, Ada_Indent_Broken))), T8 => (False, (Simple, (Int,
Ada_Indent_Broken))), T9 => (False, (Simple, (Int, Ada_Indent_Broken))), T10 => (True, (Simple, (Label =>
None)), (Simple, (Int, Ada_Indent_Broken))), T11 => (False, (Simple, (Int, Ada_Indent_Broken)))));
end case;
end protected_type_declaration_0;
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
is
pragma Unreferenced (Nonterm, Recover_Active);
T3 : constant SAL.Peek_Type := 3;
T10 : constant SAL.Peek_Type := 10;
begin
return Match_Names (Tree, Tokens, T3, T10, End_Names_Optional);
end protected_type_declaration_0_check;
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)
is
Parse_Data : Wisi.Parse_Data_Type renames Wisi.Parse_Data_Type (User_Data);
T1 : constant SAL.Peek_Type := 1;
T2 : constant SAL.Peek_Type := 2;
T3 : constant SAL.Peek_Type := 3;
T4 : constant SAL.Peek_Type := 4;
T5 : constant SAL.Peek_Type := 5;
T6 : constant SAL.Peek_Type := 6;
T10 : constant SAL.Peek_Type := 7;
T11 : constant SAL.Peek_Type := 8;
begin
case Parse_Data.Post_Parse_Action is
when Navigate =>
Statement_Action (Parse_Data, Tree, Nonterm, ((T1, Statement_Start), (T6, Motion), (T11, Statement_End)));
Name_Action (Parse_Data, Tree, Nonterm, T3);
Motion_Action (Parse_Data, Tree, Nonterm, (Index_ID'(T1, Invalid_Token_ID) & Index_ID'(T6, Invalid_Token_ID) &
Index_ID'(T10, 27) & Index_ID'(T11, Invalid_Token_ID)));
when Face =>
Face_Apply_Action (Parse_Data, Tree, Nonterm, (1 => (T3, 3, 2)));
when Indent =>
Indent_Action_0 (Parse_Data, Tree, Nonterm, (T1 => (False, (Simple, (Label => None))), T2 => (False, (Simple,
(Int, Ada_Indent_Broken))), T3 => (False, (Simple, (Int, Ada_Indent_Broken))), T4 => (False, (Simple, (Int,
Ada_Indent_Broken))), T5 => (False, (Simple, (Label => None))), T6 => (True, (Simple, (Label => None)),
(Simple, (Int, Ada_Indent))), T10 => (True, (Simple, (Label => None)), (Simple, (Int, Ada_Indent_Broken))),
T11 => (False, (Simple, (Int, Ada_Indent_Broken)))));
end case;
end protected_type_declaration_1;
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
is
pragma Unreferenced (Nonterm, Recover_Active);
T3 : constant SAL.Peek_Type := 3;
T10 : constant SAL.Peek_Type := 7;
begin
return Match_Names (Tree, Tokens, T3, T10, End_Names_Optional);
end protected_type_declaration_1_check;
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)
is
Parse_Data : Wisi.Parse_Data_Type renames Wisi.Parse_Data_Type (User_Data);
T1 : constant SAL.Peek_Type := 1;
T2 : constant SAL.Peek_Type := 2;
T3 : constant SAL.Peek_Type := 3;
T4 : constant SAL.Peek_Type := 4;
T6 : constant SAL.Peek_Type := 5;
T7 : constant SAL.Peek_Type := 6;
T8 : constant SAL.Peek_Type := 7;
T9 : constant SAL.Peek_Type := 8;
T10 : constant SAL.Peek_Type := 9;
T11 : constant SAL.Peek_Type := 10;
begin
case Parse_Data.Post_Parse_Action is
when Navigate =>
Statement_Action (Parse_Data, Tree, Nonterm, ((T1, Statement_Start), (T6, Motion), (T11, Statement_End)));
Name_Action (Parse_Data, Tree, Nonterm, T3);
Motion_Action (Parse_Data, Tree, Nonterm, (Index_ID'(T1, Invalid_Token_ID) & Index_ID'(T6, Invalid_Token_ID) &
Index_ID'(T10, 27) & Index_ID'(T11, Invalid_Token_ID)));
when Face =>
Face_Apply_Action (Parse_Data, Tree, Nonterm, (1 => (T3, 3, 2)));
when Indent =>
Indent_Action_0 (Parse_Data, Tree, Nonterm, (T1 => (False, (Simple, (Label => None))), T2 => (False, (Simple,
(Int, Ada_Indent_Broken))), T3 => (False, (Simple, (Int, Ada_Indent_Broken))), T4 => (False, (Simple, (Int,
Ada_Indent_Broken))), T6 => (True, (Simple, (Label => None)), (Simple, (Int, Ada_Indent))), T7 => (False,
(Simple, (Int, Ada_Indent_Broken))), T8 => (False, (Simple, (Int, Ada_Indent_Broken))), T9 => (False, (Simple,
(Int, Ada_Indent_Broken))), T10 => (True, (Simple, (Label => None)), (Simple, (Int, Ada_Indent_Broken))), T11
=> (False, (Simple, (Int, Ada_Indent_Broken)))));
end case;
end protected_type_declaration_2;
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
is
pragma Unreferenced (Nonterm, Recover_Active);
T3 : constant SAL.Peek_Type := 3;
T10 : constant SAL.Peek_Type := 9;
begin
return Match_Names (Tree, Tokens, T3, T10, End_Names_Optional);
end protected_type_declaration_2_check;
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)
is
Parse_Data : Wisi.Parse_Data_Type renames Wisi.Parse_Data_Type (User_Data);
T1 : constant SAL.Peek_Type := 1;
T2 : constant SAL.Peek_Type := 2;
T3 : constant SAL.Peek_Type := 3;
T4 : constant SAL.Peek_Type := 4;
T6 : constant SAL.Peek_Type := 5;
T10 : constant SAL.Peek_Type := 6;
T11 : constant SAL.Peek_Type := 7;
begin
case Parse_Data.Post_Parse_Action is
when Navigate =>
Statement_Action (Parse_Data, Tree, Nonterm, ((T1, Statement_Start), (T6, Motion), (T11, Statement_End)));
Name_Action (Parse_Data, Tree, Nonterm, T3);
Motion_Action (Parse_Data, Tree, Nonterm, (Index_ID'(T1, Invalid_Token_ID) & Index_ID'(T6, Invalid_Token_ID) &
Index_ID'(T10, 27) & Index_ID'(T11, Invalid_Token_ID)));
when Face =>
Face_Apply_Action (Parse_Data, Tree, Nonterm, (1 => (T3, 3, 2)));
when Indent =>
Indent_Action_0 (Parse_Data, Tree, Nonterm, (T1 => (False, (Simple, (Label => None))), T2 => (False, (Simple,
(Int, Ada_Indent_Broken))), T3 => (False, (Simple, (Int, Ada_Indent_Broken))), T4 => (False, (Simple, (Int,
Ada_Indent_Broken))), T6 => (True, (Simple, (Label => None)), (Simple, (Int, Ada_Indent))), T10 => (True,
(Simple, (Label => None)), (Simple, (Int, Ada_Indent_Broken))), T11 => (False, (Simple, (Int,
Ada_Indent_Broken)))));
end case;
end protected_type_declaration_3;
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
is
pragma Unreferenced (Nonterm, Recover_Active);
T3 : constant SAL.Peek_Type := 3;
T10 : constant SAL.Peek_Type := 6;
begin
return Match_Names (Tree, Tokens, T3, T10, End_Names_Optional);
end protected_type_declaration_3_check;
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)
is
Parse_Data : Wisi.Parse_Data_Type renames Wisi.Parse_Data_Type (User_Data);
T1 : constant SAL.Peek_Type := 1;
T2 : constant SAL.Peek_Type := 2;
T3 : constant SAL.Peek_Type := 3;
T5 : constant SAL.Peek_Type := 4;
T6 : constant SAL.Peek_Type := 5;
T7 : constant SAL.Peek_Type := 6;
T8 : constant SAL.Peek_Type := 7;
T9 : constant SAL.Peek_Type := 8;
T10 : constant SAL.Peek_Type := 9;
T11 : constant SAL.Peek_Type := 10;
begin
case Parse_Data.Post_Parse_Action is
when Navigate =>
Statement_Action (Parse_Data, Tree, Nonterm, ((T1, Statement_Start), (T6, Motion), (T11, Statement_End)));
Name_Action (Parse_Data, Tree, Nonterm, T3);
Motion_Action (Parse_Data, Tree, Nonterm, (Index_ID'(T1, Invalid_Token_ID) & Index_ID'(T6, Invalid_Token_ID) &
Index_ID'(T10, 27) & Index_ID'(T11, Invalid_Token_ID)));
when Face =>
Face_Apply_Action (Parse_Data, Tree, Nonterm, (1 => (T3, 3, 2)));
when Indent =>
Indent_Action_0 (Parse_Data, Tree, Nonterm, (T1 => (False, (Simple, (Label => None))), T2 => (False, (Simple,
(Int, Ada_Indent_Broken))), T3 => (False, (Simple, (Int, Ada_Indent_Broken))), T5 => (False, (Simple, (Label
=> None))), T6 => (True, (Simple, (Label => None)), (Simple, (Int, Ada_Indent))), T7 => (False, (Simple, (Int,
Ada_Indent_Broken))), T8 => (False, (Simple, (Int, Ada_Indent_Broken))), T9 => (False, (Simple, (Int,
Ada_Indent_Broken))), T10 => (True, (Simple, (Label => None)), (Simple, (Int, Ada_Indent_Broken))), T11 =>
(False, (Simple, (Int, Ada_Indent_Broken)))));
end case;
end protected_type_declaration_4;
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
is
pragma Unreferenced (Nonterm, Recover_Active);
T3 : constant SAL.Peek_Type := 3;
T10 : constant SAL.Peek_Type := 9;
begin
return Match_Names (Tree, Tokens, T3, T10, End_Names_Optional);
end protected_type_declaration_4_check;
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)
is
Parse_Data : Wisi.Parse_Data_Type renames Wisi.Parse_Data_Type (User_Data);
T1 : constant SAL.Peek_Type := 1;
T2 : constant SAL.Peek_Type := 2;
T3 : constant SAL.Peek_Type := 3;
T5 : constant SAL.Peek_Type := 4;
T6 : constant SAL.Peek_Type := 5;
T10 : constant SAL.Peek_Type := 6;
T11 : constant SAL.Peek_Type := 7;
begin
case Parse_Data.Post_Parse_Action is
when Navigate =>
Statement_Action (Parse_Data, Tree, Nonterm, ((T1, Statement_Start), (T6, Motion), (T11, Statement_End)));
Name_Action (Parse_Data, Tree, Nonterm, T3);
Motion_Action (Parse_Data, Tree, Nonterm, (Index_ID'(T1, Invalid_Token_ID) & Index_ID'(T6, Invalid_Token_ID) &
Index_ID'(T10, 27) & Index_ID'(T11, Invalid_Token_ID)));
when Face =>
Face_Apply_Action (Parse_Data, Tree, Nonterm, (1 => (T3, 3, 2)));
when Indent =>
Indent_Action_0 (Parse_Data, Tree, Nonterm, (T1 => (False, (Simple, (Label => None))), T2 => (False, (Simple,
(Int, Ada_Indent_Broken))), T3 => (False, (Simple, (Int, Ada_Indent_Broken))), T5 => (False, (Simple, (Label
=> None))), T6 => (True, (Simple, (Label => None)), (Simple, (Int, Ada_Indent))), T10 => (True, (Simple,
(Label => None)), (Simple, (Int, Ada_Indent_Broken))), T11 => (False, (Simple, (Int, Ada_Indent_Broken)))));
end case;
end protected_type_declaration_5;
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
is
pragma Unreferenced (Nonterm, Recover_Active);
T3 : constant SAL.Peek_Type := 3;
T10 : constant SAL.Peek_Type := 6;
begin
return Match_Names (Tree, Tokens, T3, T10, End_Names_Optional);
end protected_type_declaration_5_check;
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)
is
Parse_Data : Wisi.Parse_Data_Type renames Wisi.Parse_Data_Type (User_Data);
T1 : constant SAL.Peek_Type := 1;
T2 : constant SAL.Peek_Type := 2;
T3 : constant SAL.Peek_Type := 3;
T6 : constant SAL.Peek_Type := 4;
T7 : constant SAL.Peek_Type := 5;
T8 : constant SAL.Peek_Type := 6;
T9 : constant SAL.Peek_Type := 7;
T10 : constant SAL.Peek_Type := 8;
T11 : constant SAL.Peek_Type := 9;
begin
case Parse_Data.Post_Parse_Action is
when Navigate =>
Statement_Action (Parse_Data, Tree, Nonterm, ((T1, Statement_Start), (T6, Motion), (T11, Statement_End)));
Name_Action (Parse_Data, Tree, Nonterm, T3);
Motion_Action (Parse_Data, Tree, Nonterm, (Index_ID'(T1, Invalid_Token_ID) & Index_ID'(T6, Invalid_Token_ID) &
Index_ID'(T10, 27) & Index_ID'(T11, Invalid_Token_ID)));
when Face =>
Face_Apply_Action (Parse_Data, Tree, Nonterm, (1 => (T3, 3, 2)));
when Indent =>
Indent_Action_0 (Parse_Data, Tree, Nonterm, (T1 => (False, (Simple, (Label => None))), T2 => (False, (Simple,
(Int, Ada_Indent_Broken))), T3 => (False, (Simple, (Int, Ada_Indent_Broken))), T6 => (True, (Simple, (Label =>
None)), (Simple, (Int, Ada_Indent))), T7 => (False, (Simple, (Int, Ada_Indent_Broken))), T8 => (False,
(Simple, (Int, Ada_Indent_Broken))), T9 => (False, (Simple, (Int, Ada_Indent_Broken))), T10 => (True, (Simple,
(Label => None)), (Simple, (Int, Ada_Indent_Broken))), T11 => (False, (Simple, (Int, Ada_Indent_Broken)))));
end case;
end protected_type_declaration_6;
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
is
pragma Unreferenced (Nonterm, Recover_Active);
T3 : constant SAL.Peek_Type := 3;
T10 : constant SAL.Peek_Type := 8;
begin
return Match_Names (Tree, Tokens, T3, T10, End_Names_Optional);
end protected_type_declaration_6_check;
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)
is
Parse_Data : Wisi.Parse_Data_Type renames Wisi.Parse_Data_Type (User_Data);
T1 : constant SAL.Peek_Type := 1;
T2 : constant SAL.Peek_Type := 2;
T3 : constant SAL.Peek_Type := 3;
T6 : constant SAL.Peek_Type := 4;
T10 : constant SAL.Peek_Type := 5;
T11 : constant SAL.Peek_Type := 6;
begin
case Parse_Data.Post_Parse_Action is
when Navigate =>
Statement_Action (Parse_Data, Tree, Nonterm, ((T1, Statement_Start), (T6, Motion), (T11, Statement_End)));
Name_Action (Parse_Data, Tree, Nonterm, T3);
Motion_Action (Parse_Data, Tree, Nonterm, (Index_ID'(T1, Invalid_Token_ID) & Index_ID'(T6, Invalid_Token_ID) &
Index_ID'(T10, 27) & Index_ID'(T11, Invalid_Token_ID)));
when Face =>
Face_Apply_Action (Parse_Data, Tree, Nonterm, (1 => (T3, 3, 2)));
when Indent =>
Indent_Action_0 (Parse_Data, Tree, Nonterm, (T1 => (False, (Simple, (Label => None))), T2 => (False, (Simple,
(Int, Ada_Indent_Broken))), T3 => (False, (Simple, (Int, Ada_Indent_Broken))), T6 => (True, (Simple, (Label =>
None)), (Simple, (Int, Ada_Indent))), T10 => (True, (Simple, (Label => None)), (Simple, (Int,
Ada_Indent_Broken))), T11 => (False, (Simple, (Int, Ada_Indent_Broken)))));
end case;
end protected_type_declaration_7;
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
is
pragma Unreferenced (Nonterm, Recover_Active);
T3 : constant SAL.Peek_Type := 3;
T10 : constant SAL.Peek_Type := 5;
begin
return Match_Names (Tree, Tokens, T3, T10, End_Names_Optional);
end protected_type_declaration_7_check;
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)
is
Parse_Data : Wisi.Parse_Data_Type renames Wisi.Parse_Data_Type (User_Data);
T1 : constant SAL.Peek_Type := 1;
T2 : constant SAL.Peek_Type := 2;
T3 : constant SAL.Peek_Type := 3;
T4 : constant SAL.Peek_Type := 4;
T5 : constant SAL.Peek_Type := 5;
T6 : constant SAL.Peek_Type := 6;
T7 : constant SAL.Peek_Type := 7;
T8 : constant SAL.Peek_Type := 8;
T9 : constant SAL.Peek_Type := 9;
begin
case Parse_Data.Post_Parse_Action is
when Navigate =>
Statement_Action (Parse_Data, Tree, Nonterm, ((T1, Statement_Start), (T4, Motion), (T7, Motion), (T9,
Statement_End)));
Motion_Action (Parse_Data, Tree, Nonterm, (Index_ID'(T1, Invalid_Token_ID) & Index_ID'(T4, Invalid_Token_ID) &
Index_ID'(T7, Invalid_Token_ID) & Index_ID'(T8, 27) & Index_ID'(T9, Invalid_Token_ID)));
Name_Action (Parse_Data, Tree, Nonterm, T2);
when Face =>
Face_Apply_Action (Parse_Data, Tree, Nonterm, (1 => (T2, 3, 2)));
when Indent =>
Indent_Action_0 (Parse_Data, Tree, Nonterm, (T1 => (False, (Simple, (Label => None))), T2 => (False, (Simple,
(Int, Ada_Indent_Broken))), T3 => (False, (Simple, (Label => None))), T4 => (True, (Simple, (Label => None)),
(Simple, (Int, Ada_Indent))), T5 => (False, (Simple, (Int, Ada_Indent_Broken))), T6 => (False, (Simple, (Int,
Ada_Indent_Broken))), T7 => (False, (Simple, (Int, Ada_Indent_Broken))), T8 => (False, (Simple, (Label =>
None))), T9 => (False, (Simple, (Int, Ada_Indent_Broken)))));
end case;
end single_protected_declaration_0;
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
is
pragma Unreferenced (Nonterm, Recover_Active);
T2 : constant SAL.Peek_Type := 2;
T8 : constant SAL.Peek_Type := 8;
begin
return Match_Names (Tree, Tokens, T2, T8, End_Names_Optional);
end single_protected_declaration_0_check;
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)
is
Parse_Data : Wisi.Parse_Data_Type renames Wisi.Parse_Data_Type (User_Data);
T1 : constant SAL.Peek_Type := 1;
T2 : constant SAL.Peek_Type := 2;
T3 : constant SAL.Peek_Type := 3;
T4 : constant SAL.Peek_Type := 4;
T8 : constant SAL.Peek_Type := 5;
T9 : constant SAL.Peek_Type := 6;
begin
case Parse_Data.Post_Parse_Action is
when Navigate =>
Statement_Action (Parse_Data, Tree, Nonterm, ((T1, Statement_Start), (T4, Motion), (T9, Statement_End)));
Motion_Action (Parse_Data, Tree, Nonterm, (Index_ID'(T1, Invalid_Token_ID) & Index_ID'(T4, Invalid_Token_ID) &
Index_ID'(T8, 27) & Index_ID'(T9, Invalid_Token_ID)));
Name_Action (Parse_Data, Tree, Nonterm, T2);
when Face =>
Face_Apply_Action (Parse_Data, Tree, Nonterm, (1 => (T2, 3, 2)));
when Indent =>
Indent_Action_0 (Parse_Data, Tree, Nonterm, (T1 => (False, (Simple, (Label => None))), T2 => (False, (Simple,
(Int, Ada_Indent_Broken))), T3 => (False, (Simple, (Label => None))), T4 => (True, (Simple, (Label => None)),
(Simple, (Int, Ada_Indent))), T8 => (False, (Simple, (Label => None))), T9 => (False, (Simple, (Int,
Ada_Indent_Broken)))));
end case;
end single_protected_declaration_1;
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
is
pragma Unreferenced (Nonterm, Recover_Active);
T2 : constant SAL.Peek_Type := 2;
T8 : constant SAL.Peek_Type := 5;
begin
return Match_Names (Tree, Tokens, T2, T8, End_Names_Optional);
end single_protected_declaration_1_check;
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)
is
Parse_Data : Wisi.Parse_Data_Type renames Wisi.Parse_Data_Type (User_Data);
T1 : constant SAL.Peek_Type := 1;
T2 : constant SAL.Peek_Type := 2;
T4 : constant SAL.Peek_Type := 3;
T5 : constant SAL.Peek_Type := 4;
T6 : constant SAL.Peek_Type := 5;
T7 : constant SAL.Peek_Type := 6;
T8 : constant SAL.Peek_Type := 7;
T9 : constant SAL.Peek_Type := 8;
begin
case Parse_Data.Post_Parse_Action is
when Navigate =>
Statement_Action (Parse_Data, Tree, Nonterm, ((T1, Statement_Start), (T4, Motion), (T7, Motion), (T9,
Statement_End)));
Motion_Action (Parse_Data, Tree, Nonterm, (Index_ID'(T1, Invalid_Token_ID) & Index_ID'(T4, Invalid_Token_ID) &
Index_ID'(T7, Invalid_Token_ID) & Index_ID'(T8, 27) & Index_ID'(T9, Invalid_Token_ID)));
Name_Action (Parse_Data, Tree, Nonterm, T2);
when Face =>
Face_Apply_Action (Parse_Data, Tree, Nonterm, (1 => (T2, 3, 2)));
when Indent =>
Indent_Action_0 (Parse_Data, Tree, Nonterm, (T1 => (False, (Simple, (Label => None))), T2 => (False, (Simple,
(Int, Ada_Indent_Broken))), T4 => (True, (Simple, (Label => None)), (Simple, (Int, Ada_Indent))), T5 =>
(False, (Simple, (Int, Ada_Indent_Broken))), T6 => (False, (Simple, (Int, Ada_Indent_Broken))), T7 => (False,
(Simple, (Int, Ada_Indent_Broken))), T8 => (False, (Simple, (Label => None))), T9 => (False, (Simple, (Int,
Ada_Indent_Broken)))));
end case;
end single_protected_declaration_2;
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
is
pragma Unreferenced (Nonterm, Recover_Active);
T2 : constant SAL.Peek_Type := 2;
T8 : constant SAL.Peek_Type := 7;
begin
return Match_Names (Tree, Tokens, T2, T8, End_Names_Optional);
end single_protected_declaration_2_check;
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)
is
Parse_Data : Wisi.Parse_Data_Type renames Wisi.Parse_Data_Type (User_Data);
T1 : constant SAL.Peek_Type := 1;
T2 : constant SAL.Peek_Type := 2;
T4 : constant SAL.Peek_Type := 3;
T8 : constant SAL.Peek_Type := 4;
T9 : constant SAL.Peek_Type := 5;
begin
case Parse_Data.Post_Parse_Action is
when Navigate =>
Statement_Action (Parse_Data, Tree, Nonterm, ((T1, Statement_Start), (T4, Motion), (T9, Statement_End)));
Motion_Action (Parse_Data, Tree, Nonterm, (Index_ID'(T1, Invalid_Token_ID) & Index_ID'(T4, Invalid_Token_ID) &
Index_ID'(T8, 27) & Index_ID'(T9, Invalid_Token_ID)));
Name_Action (Parse_Data, Tree, Nonterm, T2);
when Face =>
Face_Apply_Action (Parse_Data, Tree, Nonterm, (1 => (T2, 3, 2)));
when Indent =>
Indent_Action_0 (Parse_Data, Tree, Nonterm, (T1 => (False, (Simple, (Label => None))), T2 => (False, (Simple,
(Int, Ada_Indent_Broken))), T4 => (True, (Simple, (Label => None)), (Simple, (Int, Ada_Indent))), T8 =>
(False, (Simple, (Label => None))), T9 => (False, (Simple, (Int, Ada_Indent_Broken)))));
end case;
end single_protected_declaration_3;
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
is
pragma Unreferenced (Nonterm, Recover_Active);
T2 : constant SAL.Peek_Type := 2;
T8 : constant SAL.Peek_Type := 4;
begin
return Match_Names (Tree, Tokens, T2, T8, End_Names_Optional);
end single_protected_declaration_3_check;
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)
is
Parse_Data : Wisi.Parse_Data_Type renames Wisi.Parse_Data_Type (User_Data);
T1 : constant SAL.Peek_Type := 1;
T2 : constant SAL.Peek_Type := 2;
T3 : constant SAL.Peek_Type := 3;
T4 : constant SAL.Peek_Type := 4;
T5 : constant SAL.Peek_Type := 5;
begin
case Parse_Data.Post_Parse_Action is
when Navigate =>
Statement_Action (Parse_Data, Tree, Nonterm, (1 => (T2, Motion)));
when Face =>
Face_Apply_Action (Parse_Data, Tree, Nonterm, (1 => (T5, 3, 2)));
when Indent =>
Indent_Action_0 (Parse_Data, Tree, Nonterm, (T1 => (True, (Simple, (Int, Ada_Indent)), (Simple, (Int,
Ada_Indent))), T2 => (False, (Simple, (Label => None))), T3 => (True, (Simple, (Int, Ada_Indent)), (Simple,
(Int, Ada_Indent))), T4 => (False, (Simple, (Label => None))), T5 => (False, (Simple, (Int,
Ada_Indent_Broken)))));
end case;
end protected_definition_0;
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
is
pragma Unreferenced (Recover_Active);
T5 : constant SAL.Peek_Type := 5;
begin
return Propagate_Name (Tree, Nonterm, Tokens, T5);
end protected_definition_0_check;
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)
is
Parse_Data : Wisi.Parse_Data_Type renames Wisi.Parse_Data_Type (User_Data);
T1 : constant SAL.Peek_Type := 1;
T2 : constant SAL.Peek_Type := 2;
T3 : constant SAL.Peek_Type := 3;
T4 : constant SAL.Peek_Type := 4;
begin
case Parse_Data.Post_Parse_Action is
when Navigate =>
Statement_Action (Parse_Data, Tree, Nonterm, (1 => (T2, Motion)));
when Face =>
null;
when Indent =>
Indent_Action_0 (Parse_Data, Tree, Nonterm, (T1 => (True, (Simple, (Int, Ada_Indent)), (Simple, (Int,
Ada_Indent))), T2 => (False, (Simple, (Label => None))), T3 => (True, (Simple, (Int, Ada_Indent)), (Simple,
(Int, Ada_Indent))), T4 => (False, (Simple, (Label => None)))));
end case;
end protected_definition_1;
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)
is
Parse_Data : Wisi.Parse_Data_Type renames Wisi.Parse_Data_Type (User_Data);
T1 : constant SAL.Peek_Type := 1;
T2 : constant SAL.Peek_Type := 2;
T4 : constant SAL.Peek_Type := 3;
T5 : constant SAL.Peek_Type := 4;
begin
case Parse_Data.Post_Parse_Action is
when Navigate =>
Statement_Action (Parse_Data, Tree, Nonterm, (1 => (T2, Motion)));
when Face =>
Face_Apply_Action (Parse_Data, Tree, Nonterm, (1 => (T5, 3, 2)));
when Indent =>
Indent_Action_0 (Parse_Data, Tree, Nonterm, (T1 => (True, (Simple, (Int, Ada_Indent)), (Simple, (Int,
Ada_Indent))), T2 => (False, (Simple, (Label => None))), T4 => (False, (Simple, (Label => None))), T5 =>
(False, (Simple, (Int, Ada_Indent_Broken)))));
end case;
end protected_definition_2;
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
is
pragma Unreferenced (Recover_Active);
T5 : constant SAL.Peek_Type := 4;
begin
return Propagate_Name (Tree, Nonterm, Tokens, T5);
end protected_definition_2_check;
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)
is
Parse_Data : Wisi.Parse_Data_Type renames Wisi.Parse_Data_Type (User_Data);
T1 : constant SAL.Peek_Type := 1;
T2 : constant SAL.Peek_Type := 2;
T4 : constant SAL.Peek_Type := 3;
begin
case Parse_Data.Post_Parse_Action is
when Navigate =>
Statement_Action (Parse_Data, Tree, Nonterm, (1 => (T2, Motion)));
when Face =>
null;
when Indent =>
Indent_Action_0 (Parse_Data, Tree, Nonterm, (T1 => (True, (Simple, (Int, Ada_Indent)), (Simple, (Int,
Ada_Indent))), T2 => (False, (Simple, (Label => None))), T4 => (False, (Simple, (Label => None)))));
end case;
end protected_definition_3;
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)
is
Parse_Data : Wisi.Parse_Data_Type renames Wisi.Parse_Data_Type (User_Data);
T1 : constant SAL.Peek_Type := 1;
T4 : constant SAL.Peek_Type := 2;
T5 : constant SAL.Peek_Type := 3;
begin
case Parse_Data.Post_Parse_Action is
when Navigate =>
Statement_Action (Parse_Data, Tree, Nonterm, (1 .. 0 => (1, Motion)));
when Face =>
Face_Apply_Action (Parse_Data, Tree, Nonterm, (1 => (T5, 3, 2)));
when Indent =>
Indent_Action_0 (Parse_Data, Tree, Nonterm, (T1 => (True, (Simple, (Int, Ada_Indent)), (Simple, (Int,
Ada_Indent))), T4 => (False, (Simple, (Label => None))), T5 => (False, (Simple, (Int, Ada_Indent_Broken)))));
end case;
end protected_definition_4;
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
is
pragma Unreferenced (Recover_Active);
T5 : constant SAL.Peek_Type := 3;
begin
return Propagate_Name (Tree, Nonterm, Tokens, T5);
end protected_definition_4_check;
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)
is
Parse_Data : Wisi.Parse_Data_Type renames Wisi.Parse_Data_Type (User_Data);
T1 : constant SAL.Peek_Type := 1;
T4 : constant SAL.Peek_Type := 2;
begin
case Parse_Data.Post_Parse_Action is
when Navigate =>
Statement_Action (Parse_Data, Tree, Nonterm, (1 .. 0 => (1, Motion)));
when Face =>
null;
when Indent =>
Indent_Action_0 (Parse_Data, Tree, Nonterm, (T1 => (True, (Simple, (Int, Ada_Indent)), (Simple, (Int,
Ada_Indent))), T4 => (False, (Simple, (Label => None)))));
end case;
end protected_definition_5;
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)
is
Parse_Data : Wisi.Parse_Data_Type renames Wisi.Parse_Data_Type (User_Data);
T2 : constant SAL.Peek_Type := 1;
T3 : constant SAL.Peek_Type := 2;
T4 : constant SAL.Peek_Type := 3;
T5 : constant SAL.Peek_Type := 4;
begin
case Parse_Data.Post_Parse_Action is
when Navigate =>
Statement_Action (Parse_Data, Tree, Nonterm, (1 => (T2, Motion)));
when Face =>
Face_Apply_Action (Parse_Data, Tree, Nonterm, (1 => (T5, 3, 2)));
when Indent =>
Indent_Action_0 (Parse_Data, Tree, Nonterm, (T2 => (False, (Simple, (Label => None))), T3 => (True, (Simple,
(Int, Ada_Indent)), (Simple, (Int, Ada_Indent))), T4 => (False, (Simple, (Label => None))), T5 => (False,
(Simple, (Int, Ada_Indent_Broken)))));
end case;
end protected_definition_6;
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
is
pragma Unreferenced (Recover_Active);
T5 : constant SAL.Peek_Type := 4;
begin
return Propagate_Name (Tree, Nonterm, Tokens, T5);
end protected_definition_6_check;
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)
is
Parse_Data : Wisi.Parse_Data_Type renames Wisi.Parse_Data_Type (User_Data);
T2 : constant SAL.Peek_Type := 1;
T3 : constant SAL.Peek_Type := 2;
T4 : constant SAL.Peek_Type := 3;
begin
case Parse_Data.Post_Parse_Action is
when Navigate =>
Statement_Action (Parse_Data, Tree, Nonterm, (1 => (T2, Motion)));
when Face =>
null;
when Indent =>
Indent_Action_0 (Parse_Data, Tree, Nonterm, (T2 => (False, (Simple, (Label => None))), T3 => (True, (Simple,
(Int, Ada_Indent)), (Simple, (Int, Ada_Indent))), T4 => (False, (Simple, (Label => None)))));
end case;
end protected_definition_7;
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)
is
Parse_Data : Wisi.Parse_Data_Type renames Wisi.Parse_Data_Type (User_Data);
T2 : constant SAL.Peek_Type := 1;
T4 : constant SAL.Peek_Type := 2;
T5 : constant SAL.Peek_Type := 3;
begin
case Parse_Data.Post_Parse_Action is
when Navigate =>
Statement_Action (Parse_Data, Tree, Nonterm, (1 => (T2, Motion)));
when Face =>
Face_Apply_Action (Parse_Data, Tree, Nonterm, (1 => (T5, 3, 2)));
when Indent =>
Indent_Action_0 (Parse_Data, Tree, Nonterm, (T2 => (False, (Simple, (Label => None))), T4 => (False, (Simple,
(Label => None))), T5 => (False, (Simple, (Int, Ada_Indent_Broken)))));
end case;
end protected_definition_8;
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
is
pragma Unreferenced (Recover_Active);
T5 : constant SAL.Peek_Type := 3;
begin
return Propagate_Name (Tree, Nonterm, Tokens, T5);
end protected_definition_8_check;
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)
is
Parse_Data : Wisi.Parse_Data_Type renames Wisi.Parse_Data_Type (User_Data);
T2 : constant SAL.Peek_Type := 1;
T4 : constant SAL.Peek_Type := 2;
begin
case Parse_Data.Post_Parse_Action is
when Navigate =>
Statement_Action (Parse_Data, Tree, Nonterm, (1 => (T2, Motion)));
when Face =>
null;
when Indent =>
Indent_Action_0 (Parse_Data, Tree, Nonterm, (T2 => (False, (Simple, (Label => None))), T4 => (False, (Simple,
(Label => None)))));
end case;
end protected_definition_9;
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)
is
Parse_Data : Wisi.Parse_Data_Type renames Wisi.Parse_Data_Type (User_Data);
T4 : constant SAL.Peek_Type := 1;
T5 : constant SAL.Peek_Type := 2;
begin
case Parse_Data.Post_Parse_Action is
when Navigate =>
Statement_Action (Parse_Data, Tree, Nonterm, (1 .. 0 => (1, Motion)));
when Face =>
Face_Apply_Action (Parse_Data, Tree, Nonterm, (1 => (T5, 3, 2)));
when Indent =>
Indent_Action_0 (Parse_Data, Tree, Nonterm, (T4 => (False, (Simple, (Label => None))), T5 => (False, (Simple,
(Int, Ada_Indent_Broken)))));
end case;
end protected_definition_10;
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
is
pragma Unreferenced (Recover_Active);
T5 : constant SAL.Peek_Type := 2;
begin
return Propagate_Name (Tree, Nonterm, Tokens, T5);
end protected_definition_10_check;
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)
is
Parse_Data : Wisi.Parse_Data_Type renames Wisi.Parse_Data_Type (User_Data);
T4 : constant SAL.Peek_Type := 1;
begin
case Parse_Data.Post_Parse_Action is
when Navigate =>
Statement_Action (Parse_Data, Tree, Nonterm, (1 .. 0 => (1, Motion)));
when Face =>
null;
when Indent =>
Indent_Action_0 (Parse_Data, Tree, Nonterm, (T4 => (False, (Simple, (Label => None)))));
end case;
end protected_definition_11;
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)
is
Parse_Data : Wisi.Parse_Data_Type renames Wisi.Parse_Data_Type (User_Data);
T1 : constant SAL.Peek_Type := 1;
T2 : constant SAL.Peek_Type := 2;
T3 : constant SAL.Peek_Type := 3;
T4 : constant SAL.Peek_Type := 4;
T5 : constant SAL.Peek_Type := 5;
T6 : constant SAL.Peek_Type := 6;
T7 : constant SAL.Peek_Type := 7;
T8 : constant SAL.Peek_Type := 8;
T9 : constant SAL.Peek_Type := 9;
begin
case Parse_Data.Post_Parse_Action is
when Navigate =>
Statement_Action (Parse_Data, Tree, Nonterm, ((T1, Statement_Start), (T5, Motion), (T9, Statement_End)));
Name_Action (Parse_Data, Tree, Nonterm, T3);
Motion_Action (Parse_Data, Tree, Nonterm, (Index_ID'(T1, Invalid_Token_ID) & Index_ID'(T5, Invalid_Token_ID) &
Index_ID'(T9, Invalid_Token_ID)));
when Face =>
Face_Apply_Action (Parse_Data, Tree, Nonterm, ((T3, 3, 2), (T8, 3, 2)));
when Indent =>
Indent_Action_0 (Parse_Data, Tree, Nonterm, (T1 => (False, (Simple, (Label => None))), T2 => (False, (Simple,
(Int, Ada_Indent_Broken))), T3 => (False, (Simple, (Int, Ada_Indent_Broken))), T4 => (False, (Simple, (Label
=> None))), T5 => (False, (Simple, (Label => None))), T6 => (True, (Simple, (Block, Ada_Indent)), (Simple,
(Int, Ada_Indent))), T7 => (False, (Simple, (Label => None))), T8 => (False, (Simple, (Int,
Ada_Indent_Broken))), T9 => (False, (Simple, (Int, Ada_Indent_Broken)))));
end case;
end protected_body_0;
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
is
pragma Unreferenced (Nonterm, Recover_Active);
T3 : constant SAL.Peek_Type := 3;
T8 : constant SAL.Peek_Type := 8;
begin
return Match_Names (Tree, Tokens, T3, T8, End_Names_Optional);
end protected_body_0_check;
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)
is
Parse_Data : Wisi.Parse_Data_Type renames Wisi.Parse_Data_Type (User_Data);
T1 : constant SAL.Peek_Type := 1;
T2 : constant SAL.Peek_Type := 2;
T3 : constant SAL.Peek_Type := 3;
T4 : constant SAL.Peek_Type := 4;
T5 : constant SAL.Peek_Type := 5;
T7 : constant SAL.Peek_Type := 6;
T8 : constant SAL.Peek_Type := 7;
T9 : constant SAL.Peek_Type := 8;
begin
case Parse_Data.Post_Parse_Action is
when Navigate =>
Statement_Action (Parse_Data, Tree, Nonterm, ((T1, Statement_Start), (T5, Motion), (T9, Statement_End)));
Name_Action (Parse_Data, Tree, Nonterm, T3);
Motion_Action (Parse_Data, Tree, Nonterm, (Index_ID'(T1, Invalid_Token_ID) & Index_ID'(T5, Invalid_Token_ID) &
Index_ID'(T9, Invalid_Token_ID)));
when Face =>
Face_Apply_Action (Parse_Data, Tree, Nonterm, ((T3, 3, 2), (T8, 3, 2)));
when Indent =>
Indent_Action_0 (Parse_Data, Tree, Nonterm, (T1 => (False, (Simple, (Label => None))), T2 => (False, (Simple,
(Int, Ada_Indent_Broken))), T3 => (False, (Simple, (Int, Ada_Indent_Broken))), T4 => (False, (Simple, (Label
=> None))), T5 => (False, (Simple, (Label => None))), T7 => (False, (Simple, (Label => None))), T8 => (False,
(Simple, (Int, Ada_Indent_Broken))), T9 => (False, (Simple, (Int, Ada_Indent_Broken)))));
end case;
end protected_body_1;
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
is
pragma Unreferenced (Nonterm, Recover_Active);
T3 : constant SAL.Peek_Type := 3;
T8 : constant SAL.Peek_Type := 7;
begin
return Match_Names (Tree, Tokens, T3, T8, End_Names_Optional);
end protected_body_1_check;
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)
is
Parse_Data : Wisi.Parse_Data_Type renames Wisi.Parse_Data_Type (User_Data);
T1 : constant SAL.Peek_Type := 1;
T2 : constant SAL.Peek_Type := 2;
T3 : constant SAL.Peek_Type := 3;
T5 : constant SAL.Peek_Type := 4;
T6 : constant SAL.Peek_Type := 5;
T7 : constant SAL.Peek_Type := 6;
T8 : constant SAL.Peek_Type := 7;
T9 : constant SAL.Peek_Type := 8;
begin
case Parse_Data.Post_Parse_Action is
when Navigate =>
Statement_Action (Parse_Data, Tree, Nonterm, ((T1, Statement_Start), (T5, Motion), (T9, Statement_End)));
Name_Action (Parse_Data, Tree, Nonterm, T3);
Motion_Action (Parse_Data, Tree, Nonterm, (Index_ID'(T1, Invalid_Token_ID) & Index_ID'(T5, Invalid_Token_ID) &
Index_ID'(T9, Invalid_Token_ID)));
when Face =>
Face_Apply_Action (Parse_Data, Tree, Nonterm, ((T3, 3, 2), (T8, 3, 2)));
when Indent =>
Indent_Action_0 (Parse_Data, Tree, Nonterm, (T1 => (False, (Simple, (Label => None))), T2 => (False, (Simple,
(Int, Ada_Indent_Broken))), T3 => (False, (Simple, (Int, Ada_Indent_Broken))), T5 => (False, (Simple, (Label
=> None))), T6 => (True, (Simple, (Block, Ada_Indent)), (Simple, (Int, Ada_Indent))), T7 => (False, (Simple,
(Label => None))), T8 => (False, (Simple, (Int, Ada_Indent_Broken))), T9 => (False, (Simple, (Int,
Ada_Indent_Broken)))));
end case;
end protected_body_2;
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
is
pragma Unreferenced (Nonterm, Recover_Active);
T3 : constant SAL.Peek_Type := 3;
T8 : constant SAL.Peek_Type := 7;
begin
return Match_Names (Tree, Tokens, T3, T8, End_Names_Optional);
end protected_body_2_check;
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)
is
Parse_Data : Wisi.Parse_Data_Type renames Wisi.Parse_Data_Type (User_Data);
T1 : constant SAL.Peek_Type := 1;
T2 : constant SAL.Peek_Type := 2;
T3 : constant SAL.Peek_Type := 3;
T5 : constant SAL.Peek_Type := 4;
T7 : constant SAL.Peek_Type := 5;
T8 : constant SAL.Peek_Type := 6;
T9 : constant SAL.Peek_Type := 7;
begin
case Parse_Data.Post_Parse_Action is
when Navigate =>
Statement_Action (Parse_Data, Tree, Nonterm, ((T1, Statement_Start), (T5, Motion), (T9, Statement_End)));
Name_Action (Parse_Data, Tree, Nonterm, T3);
Motion_Action (Parse_Data, Tree, Nonterm, (Index_ID'(T1, Invalid_Token_ID) & Index_ID'(T5, Invalid_Token_ID) &
Index_ID'(T9, Invalid_Token_ID)));
when Face =>
Face_Apply_Action (Parse_Data, Tree, Nonterm, ((T3, 3, 2), (T8, 3, 2)));
when Indent =>
Indent_Action_0 (Parse_Data, Tree, Nonterm, (T1 => (False, (Simple, (Label => None))), T2 => (False, (Simple,
(Int, Ada_Indent_Broken))), T3 => (False, (Simple, (Int, Ada_Indent_Broken))), T5 => (False, (Simple, (Label
=> None))), T7 => (False, (Simple, (Label => None))), T8 => (False, (Simple, (Int, Ada_Indent_Broken))), T9 =>
(False, (Simple, (Int, Ada_Indent_Broken)))));
end case;
end protected_body_3;
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
is
pragma Unreferenced (Nonterm, Recover_Active);
T3 : constant SAL.Peek_Type := 3;
T8 : constant SAL.Peek_Type := 6;
begin
return Match_Names (Tree, Tokens, T3, T8, End_Names_Optional);
end protected_body_3_check;
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)
is
Parse_Data : Wisi.Parse_Data_Type renames Wisi.Parse_Data_Type (User_Data);
T1 : constant SAL.Peek_Type := 1;
T2 : constant SAL.Peek_Type := 2;
T3 : constant SAL.Peek_Type := 3;
T4 : constant SAL.Peek_Type := 4;
T5 : constant SAL.Peek_Type := 5;
T6 : constant SAL.Peek_Type := 6;
T7 : constant SAL.Peek_Type := 7;
T8 : constant SAL.Peek_Type := 8;
T9 : constant SAL.Peek_Type := 9;
begin
case Parse_Data.Post_Parse_Action is
when Navigate =>
Statement_Action (Parse_Data, Tree, Nonterm, ((T1, Statement_Start), (T2, Statement_Override), (T9,
Statement_End)));
Name_Action (Parse_Data, Tree, Nonterm, T3);
when Face =>
Face_Apply_Action (Parse_Data, Tree, Nonterm, (1 => (T3, 3, 1)));
when Indent =>
Indent_Action_0 (Parse_Data, Tree, Nonterm, (T1 => (False, (Simple, (Label => None))), T2 => (False, (Simple,
(Label => None))), T3 => (False, (Simple, (Int, Ada_Indent_Broken))), T4 => (False, (Simple, (Int,
Ada_Indent_Broken))), T5 => (False, (Simple, (Anchored_0, T4, 1))), T6 => (False, (Simple, (Anchored_0, T4,
0))), T7 => (False, (Simple, (Int, Ada_Indent_Broken))), T8 => (False, (Simple, (Label => None))), T9 =>
(False, (Simple, (Int, Ada_Indent_Broken)))));
end case;
end entry_declaration_0;
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)
is
Parse_Data : Wisi.Parse_Data_Type renames Wisi.Parse_Data_Type (User_Data);
T1 : constant SAL.Peek_Type := 1;
T2 : constant SAL.Peek_Type := 2;
T3 : constant SAL.Peek_Type := 3;
T4 : constant SAL.Peek_Type := 4;
T5 : constant SAL.Peek_Type := 5;
T6 : constant SAL.Peek_Type := 6;
T7 : constant SAL.Peek_Type := 7;
T9 : constant SAL.Peek_Type := 8;
begin
case Parse_Data.Post_Parse_Action is
when Navigate =>
Statement_Action (Parse_Data, Tree, Nonterm, ((T1, Statement_Start), (T2, Statement_Override), (T9,
Statement_End)));
Name_Action (Parse_Data, Tree, Nonterm, T3);
when Face =>
Face_Apply_Action (Parse_Data, Tree, Nonterm, (1 => (T3, 3, 1)));
when Indent =>
Indent_Action_0 (Parse_Data, Tree, Nonterm, (T1 => (False, (Simple, (Label => None))), T2 => (False, (Simple,
(Label => None))), T3 => (False, (Simple, (Int, Ada_Indent_Broken))), T4 => (False, (Simple, (Int,
Ada_Indent_Broken))), T5 => (False, (Simple, (Anchored_0, T4, 1))), T6 => (False, (Simple, (Anchored_0, T4,
0))), T7 => (False, (Simple, (Int, Ada_Indent_Broken))), T9 => (False, (Simple, (Int, Ada_Indent_Broken)))));
end case;
end entry_declaration_1;
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)
is
Parse_Data : Wisi.Parse_Data_Type renames Wisi.Parse_Data_Type (User_Data);
T1 : constant SAL.Peek_Type := 1;
T2 : constant SAL.Peek_Type := 2;
T3 : constant SAL.Peek_Type := 3;
T7 : constant SAL.Peek_Type := 4;
T8 : constant SAL.Peek_Type := 5;
T9 : constant SAL.Peek_Type := 6;
begin
case Parse_Data.Post_Parse_Action is
when Navigate =>
Statement_Action (Parse_Data, Tree, Nonterm, ((T1, Statement_Start), (T2, Statement_Override), (T9,
Statement_End)));
Name_Action (Parse_Data, Tree, Nonterm, T3);
when Face =>
Face_Apply_Action (Parse_Data, Tree, Nonterm, (1 => (T3, 3, 1)));
when Indent =>
Indent_Action_0 (Parse_Data, Tree, Nonterm, (T1 => (False, (Simple, (Label => None))), T2 => (False, (Simple,
(Label => None))), T3 => (False, (Simple, (Int, Ada_Indent_Broken))), T7 => (False, (Simple, (Int,
Ada_Indent_Broken))), T8 => (False, (Simple, (Label => None))), T9 => (False, (Simple, (Int,
Ada_Indent_Broken)))));
end case;
end entry_declaration_2;
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)
is
Parse_Data : Wisi.Parse_Data_Type renames Wisi.Parse_Data_Type (User_Data);
T1 : constant SAL.Peek_Type := 1;
T2 : constant SAL.Peek_Type := 2;
T3 : constant SAL.Peek_Type := 3;
T7 : constant SAL.Peek_Type := 4;
T9 : constant SAL.Peek_Type := 5;
begin
case Parse_Data.Post_Parse_Action is
when Navigate =>
Statement_Action (Parse_Data, Tree, Nonterm, ((T1, Statement_Start), (T2, Statement_Override), (T9,
Statement_End)));
Name_Action (Parse_Data, Tree, Nonterm, T3);
when Face =>
Face_Apply_Action (Parse_Data, Tree, Nonterm, (1 => (T3, 3, 1)));
when Indent =>
Indent_Action_0 (Parse_Data, Tree, Nonterm, (T1 => (False, (Simple, (Label => None))), T2 => (False, (Simple,
(Label => None))), T3 => (False, (Simple, (Int, Ada_Indent_Broken))), T7 => (False, (Simple, (Int,
Ada_Indent_Broken))), T9 => (False, (Simple, (Int, Ada_Indent_Broken)))));
end case;
end entry_declaration_3;
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)
is
Parse_Data : Wisi.Parse_Data_Type renames Wisi.Parse_Data_Type (User_Data);
T2 : constant SAL.Peek_Type := 1;
T3 : constant SAL.Peek_Type := 2;
T4 : constant SAL.Peek_Type := 3;
T5 : constant SAL.Peek_Type := 4;
T6 : constant SAL.Peek_Type := 5;
T7 : constant SAL.Peek_Type := 6;
T8 : constant SAL.Peek_Type := 7;
T9 : constant SAL.Peek_Type := 8;
begin
case Parse_Data.Post_Parse_Action is
when Navigate =>
Statement_Action (Parse_Data, Tree, Nonterm, ((T2, Statement_Override), (T9, Statement_End)));
Name_Action (Parse_Data, Tree, Nonterm, T3);
when Face =>
Face_Apply_Action (Parse_Data, Tree, Nonterm, (1 => (T3, 3, 1)));
when Indent =>
Indent_Action_0 (Parse_Data, Tree, Nonterm, (T2 => (False, (Simple, (Label => None))), T3 => (False, (Simple,
(Int, Ada_Indent_Broken))), T4 => (False, (Simple, (Int, Ada_Indent_Broken))), T5 => (False, (Simple,
(Anchored_0, T4, 1))), T6 => (False, (Simple, (Anchored_0, T4, 0))), T7 => (False, (Simple, (Int,
Ada_Indent_Broken))), T8 => (False, (Simple, (Label => None))), T9 => (False, (Simple, (Int,
Ada_Indent_Broken)))));
end case;
end entry_declaration_4;
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)
is
Parse_Data : Wisi.Parse_Data_Type renames Wisi.Parse_Data_Type (User_Data);
T2 : constant SAL.Peek_Type := 1;
T3 : constant SAL.Peek_Type := 2;
T4 : constant SAL.Peek_Type := 3;
T5 : constant SAL.Peek_Type := 4;
T6 : constant SAL.Peek_Type := 5;
T7 : constant SAL.Peek_Type := 6;
T9 : constant SAL.Peek_Type := 7;
begin
case Parse_Data.Post_Parse_Action is
when Navigate =>
Statement_Action (Parse_Data, Tree, Nonterm, ((T2, Statement_Override), (T9, Statement_End)));
Name_Action (Parse_Data, Tree, Nonterm, T3);
when Face =>
Face_Apply_Action (Parse_Data, Tree, Nonterm, (1 => (T3, 3, 1)));
when Indent =>
Indent_Action_0 (Parse_Data, Tree, Nonterm, (T2 => (False, (Simple, (Label => None))), T3 => (False, (Simple,
(Int, Ada_Indent_Broken))), T4 => (False, (Simple, (Int, Ada_Indent_Broken))), T5 => (False, (Simple,
(Anchored_0, T4, 1))), T6 => (False, (Simple, (Anchored_0, T4, 0))), T7 => (False, (Simple, (Int,
Ada_Indent_Broken))), T9 => (False, (Simple, (Int, Ada_Indent_Broken)))));
end case;
end entry_declaration_5;
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)
is
Parse_Data : Wisi.Parse_Data_Type renames Wisi.Parse_Data_Type (User_Data);
T2 : constant SAL.Peek_Type := 1;
T3 : constant SAL.Peek_Type := 2;
T7 : constant SAL.Peek_Type := 3;
T8 : constant SAL.Peek_Type := 4;
T9 : constant SAL.Peek_Type := 5;
begin
case Parse_Data.Post_Parse_Action is
when Navigate =>
Statement_Action (Parse_Data, Tree, Nonterm, ((T2, Statement_Override), (T9, Statement_End)));
Name_Action (Parse_Data, Tree, Nonterm, T3);
when Face =>
Face_Apply_Action (Parse_Data, Tree, Nonterm, (1 => (T3, 3, 1)));
when Indent =>
Indent_Action_0 (Parse_Data, Tree, Nonterm, (T2 => (False, (Simple, (Label => None))), T3 => (False, (Simple,
(Int, Ada_Indent_Broken))), T7 => (False, (Simple, (Int, Ada_Indent_Broken))), T8 => (False, (Simple, (Label
=> None))), T9 => (False, (Simple, (Int, Ada_Indent_Broken)))));
end case;
end entry_declaration_6;
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)
is
Parse_Data : Wisi.Parse_Data_Type renames Wisi.Parse_Data_Type (User_Data);
T2 : constant SAL.Peek_Type := 1;
T3 : constant SAL.Peek_Type := 2;
T7 : constant SAL.Peek_Type := 3;
T9 : constant SAL.Peek_Type := 4;
begin
case Parse_Data.Post_Parse_Action is
when Navigate =>
Statement_Action (Parse_Data, Tree, Nonterm, ((T2, Statement_Override), (T9, Statement_End)));
Name_Action (Parse_Data, Tree, Nonterm, T3);
when Face =>
Face_Apply_Action (Parse_Data, Tree, Nonterm, (1 => (T3, 3, 1)));
when Indent =>
Indent_Action_0 (Parse_Data, Tree, Nonterm, (T2 => (False, (Simple, (Label => None))), T3 => (False, (Simple,
(Int, Ada_Indent_Broken))), T7 => (False, (Simple, (Int, Ada_Indent_Broken))), T9 => (False, (Simple, (Int,
Ada_Indent_Broken)))));
end case;
end entry_declaration_7;
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)
is
Parse_Data : Wisi.Parse_Data_Type renames Wisi.Parse_Data_Type (User_Data);
T1 : constant SAL.Peek_Type := 1;
T2 : constant SAL.Peek_Type := 2;
T3 : constant SAL.Peek_Type := 3;
T4 : constant SAL.Peek_Type := 4;
T5 : constant SAL.Peek_Type := 5;
T6 : constant SAL.Peek_Type := 6;
T7 : constant SAL.Peek_Type := 7;
T8 : constant SAL.Peek_Type := 8;
T9 : constant SAL.Peek_Type := 9;
T10 : constant SAL.Peek_Type := 10;
T11 : constant SAL.Peek_Type := 11;
begin
case Parse_Data.Post_Parse_Action is
when Navigate =>
Statement_Action (Parse_Data, Tree, Nonterm, ((T1, Statement_Start), (T7, Motion), (T11, Statement_End)));
Motion_Action (Parse_Data, Tree, Nonterm, (Index_ID'(T1, Invalid_Token_ID) & Index_ID'(T7, Invalid_Token_ID) &
Index_ID'(T8, 63) & Index_ID'(T11, Invalid_Token_ID)));
when Face =>
Face_Apply_Action (Parse_Data, Tree, Nonterm, ((T2, 3, 1), (T10, 3, 1)));
when Indent =>
Indent_Action_0 (Parse_Data, Tree, Nonterm, (T1 => (False, (Simple, (Label => None))), T2 => (False, (Simple,
(Int, Ada_Indent_Broken))), T3 => (False, (Simple, (Int, Ada_Indent_Broken))), T4 => (False, (Simple, (Label
=> None))), T5 => (False, (Simple, (Label => None))), T6 => (False, (Simple, (Int, Ada_Indent_Broken))), T7 =>
(True, (Simple, (Label => None)), (Simple, (Int, Ada_Indent))), T8 => (True, (Simple, (Block, Ada_Indent)),
(Simple, (Int, Ada_Indent))), T9 => (False, (Simple, (Label => None))), T10 => (False, (Simple, (Int,
Ada_Indent_Broken))), T11 => (False, (Simple, (Int, Ada_Indent_Broken)))));
end case;
end accept_statement_0;
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
is
pragma Unreferenced (Nonterm, Recover_Active);
T2 : constant SAL.Peek_Type := 2;
T10 : constant SAL.Peek_Type := 10;
begin
return Match_Names (Tree, Tokens, T2, T10, End_Names_Optional);
end accept_statement_0_check;
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)
is
Parse_Data : Wisi.Parse_Data_Type renames Wisi.Parse_Data_Type (User_Data);
T1 : constant SAL.Peek_Type := 1;
T2 : constant SAL.Peek_Type := 2;
T3 : constant SAL.Peek_Type := 3;
T4 : constant SAL.Peek_Type := 4;
T5 : constant SAL.Peek_Type := 5;
T6 : constant SAL.Peek_Type := 6;
T11 : constant SAL.Peek_Type := 7;
begin
case Parse_Data.Post_Parse_Action is
when Navigate =>
Statement_Action (Parse_Data, Tree, Nonterm, ((T1, Statement_Start), (T11, Statement_End)));
Motion_Action (Parse_Data, Tree, Nonterm, (Index_ID'(T1, Invalid_Token_ID) & Index_ID'(T11,
Invalid_Token_ID)));
when Face =>
Face_Apply_Action (Parse_Data, Tree, Nonterm, (1 => (T2, 3, 1)));
when Indent =>
Indent_Action_0 (Parse_Data, Tree, Nonterm, (T1 => (False, (Simple, (Label => None))), T2 => (False, (Simple,
(Int, Ada_Indent_Broken))), T3 => (False, (Simple, (Int, Ada_Indent_Broken))), T4 => (False, (Simple, (Label
=> None))), T5 => (False, (Simple, (Label => None))), T6 => (False, (Simple, (Int, Ada_Indent_Broken))), T11
=> (False, (Simple, (Int, Ada_Indent_Broken)))));
end case;
end accept_statement_1;
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)
is
Parse_Data : Wisi.Parse_Data_Type renames Wisi.Parse_Data_Type (User_Data);
T1 : constant SAL.Peek_Type := 1;
T2 : constant SAL.Peek_Type := 2;
T6 : constant SAL.Peek_Type := 3;
T7 : constant SAL.Peek_Type := 4;
T8 : constant SAL.Peek_Type := 5;
T9 : constant SAL.Peek_Type := 6;
T10 : constant SAL.Peek_Type := 7;
T11 : constant SAL.Peek_Type := 8;
begin
case Parse_Data.Post_Parse_Action is
when Navigate =>
Statement_Action (Parse_Data, Tree, Nonterm, ((T1, Statement_Start), (T7, Motion), (T11, Statement_End)));
Motion_Action (Parse_Data, Tree, Nonterm, (Index_ID'(T1, Invalid_Token_ID) & Index_ID'(T7, Invalid_Token_ID) &
Index_ID'(T8, 63) & Index_ID'(T11, Invalid_Token_ID)));
when Face =>
Face_Apply_Action (Parse_Data, Tree, Nonterm, ((T2, 3, 1), (T10, 3, 1)));
when Indent =>
Indent_Action_0 (Parse_Data, Tree, Nonterm, (T1 => (False, (Simple, (Label => None))), T2 => (False, (Simple,
(Int, Ada_Indent_Broken))), T6 => (False, (Simple, (Int, Ada_Indent_Broken))), T7 => (True, (Simple, (Label =>
None)), (Simple, (Int, Ada_Indent))), T8 => (True, (Simple, (Block, Ada_Indent)), (Simple, (Int,
Ada_Indent))), T9 => (False, (Simple, (Label => None))), T10 => (False, (Simple, (Int, Ada_Indent_Broken))),
T11 => (False, (Simple, (Int, Ada_Indent_Broken)))));
end case;
end accept_statement_2;
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
is
pragma Unreferenced (Nonterm, Recover_Active);
T2 : constant SAL.Peek_Type := 2;
T10 : constant SAL.Peek_Type := 7;
begin
return Match_Names (Tree, Tokens, T2, T10, End_Names_Optional);
end accept_statement_2_check;
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)
is
Parse_Data : Wisi.Parse_Data_Type renames Wisi.Parse_Data_Type (User_Data);
T1 : constant SAL.Peek_Type := 1;
T2 : constant SAL.Peek_Type := 2;
T6 : constant SAL.Peek_Type := 3;
T11 : constant SAL.Peek_Type := 4;
begin
case Parse_Data.Post_Parse_Action is
when Navigate =>
Statement_Action (Parse_Data, Tree, Nonterm, ((T1, Statement_Start), (T11, Statement_End)));
Motion_Action (Parse_Data, Tree, Nonterm, (Index_ID'(T1, Invalid_Token_ID) & Index_ID'(T11,
Invalid_Token_ID)));
when Face =>
Face_Apply_Action (Parse_Data, Tree, Nonterm, (1 => (T2, 3, 1)));
when Indent =>
Indent_Action_0 (Parse_Data, Tree, Nonterm, (T1 => (False, (Simple, (Label => None))), T2 => (False, (Simple,
(Int, Ada_Indent_Broken))), T6 => (False, (Simple, (Int, Ada_Indent_Broken))), T11 => (False, (Simple, (Int,
Ada_Indent_Broken)))));
end case;
end accept_statement_3;
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)
is
Parse_Data : Wisi.Parse_Data_Type renames Wisi.Parse_Data_Type (User_Data);
T1 : constant SAL.Peek_Type := 1;
T2 : constant SAL.Peek_Type := 2;
T3 : constant SAL.Peek_Type := 3;
T4 : constant SAL.Peek_Type := 4;
T5 : constant SAL.Peek_Type := 5;
T6 : constant SAL.Peek_Type := 6;
T7 : constant SAL.Peek_Type := 7;
T8 : constant SAL.Peek_Type := 8;
T9 : constant SAL.Peek_Type := 9;
T10 : constant SAL.Peek_Type := 10;
T11 : constant SAL.Peek_Type := 11;
T12 : constant SAL.Peek_Type := 12;
begin
case Parse_Data.Post_Parse_Action is
when Navigate =>
Statement_Action (Parse_Data, Tree, Nonterm, ((T1, Statement_Start), (T5, Motion), (T6, Motion), (T8, Motion),
(T12, Statement_End)));
Name_Action (Parse_Data, Tree, Nonterm, T2);
Motion_Action (Parse_Data, Tree, Nonterm, (Index_ID'(T1, Invalid_Token_ID) & Index_ID'(T5, Invalid_Token_ID) &
Index_ID'(T6, Invalid_Token_ID) & Index_ID'(T8, Invalid_Token_ID) & Index_ID'(T9, 63) & Index_ID'(T12,
Invalid_Token_ID)));
when Face =>
Face_Apply_Action (Parse_Data, Tree, Nonterm, ((T2, 3, 1), (T11, 3, 1)));
when Indent =>
Indent_Action_0 (Parse_Data, Tree, Nonterm, (T1 => (False, (Simple, (Label => None))), T2 => (False, (Simple,
(Int, Ada_Indent_Broken))), T3 => (False, (Simple, (Int, Ada_Indent_Broken))), T4 => (False, (Simple, (Label
=> None))), T5 => (False, (Simple, (Int, Ada_Indent_Broken))), T6 => (False, (Simple, (Label => None))), T7 =>
(True, (Simple, (Int, Ada_Indent)), (Simple, (Int, Ada_Indent))), T8 => (False, (Simple, (Label => None))), T9
=> (True, (Simple, (Int, Ada_Indent)), (Simple, (Int, Ada_Indent))), T10 => (False, (Simple, (Label =>
None))), T11 => (False, (Simple, (Int, Ada_Indent_Broken))), T12 => (False, (Simple, (Int,
Ada_Indent_Broken)))));
end case;
end entry_body_0;
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
is
pragma Unreferenced (Nonterm, Recover_Active);
T2 : constant SAL.Peek_Type := 2;
T11 : constant SAL.Peek_Type := 11;
begin
return Match_Names (Tree, Tokens, T2, T11, End_Names_Optional);
end entry_body_0_check;
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)
is
Parse_Data : Wisi.Parse_Data_Type renames Wisi.Parse_Data_Type (User_Data);
T1 : constant SAL.Peek_Type := 1;
T2 : constant SAL.Peek_Type := 2;
T3 : constant SAL.Peek_Type := 3;
T5 : constant SAL.Peek_Type := 4;
T6 : constant SAL.Peek_Type := 5;
T7 : constant SAL.Peek_Type := 6;
T8 : constant SAL.Peek_Type := 7;
T9 : constant SAL.Peek_Type := 8;
T10 : constant SAL.Peek_Type := 9;
T11 : constant SAL.Peek_Type := 10;
T12 : constant SAL.Peek_Type := 11;
begin
case Parse_Data.Post_Parse_Action is
when Navigate =>
Statement_Action (Parse_Data, Tree, Nonterm, ((T1, Statement_Start), (T5, Motion), (T6, Motion), (T8, Motion),
(T12, Statement_End)));
Name_Action (Parse_Data, Tree, Nonterm, T2);
Motion_Action (Parse_Data, Tree, Nonterm, (Index_ID'(T1, Invalid_Token_ID) & Index_ID'(T5, Invalid_Token_ID) &
Index_ID'(T6, Invalid_Token_ID) & Index_ID'(T8, Invalid_Token_ID) & Index_ID'(T9, 63) & Index_ID'(T12,
Invalid_Token_ID)));
when Face =>
Face_Apply_Action (Parse_Data, Tree, Nonterm, ((T2, 3, 1), (T11, 3, 1)));
when Indent =>
Indent_Action_0 (Parse_Data, Tree, Nonterm, (T1 => (False, (Simple, (Label => None))), T2 => (False, (Simple,
(Int, Ada_Indent_Broken))), T3 => (False, (Simple, (Int, Ada_Indent_Broken))), T5 => (False, (Simple, (Int,
Ada_Indent_Broken))), T6 => (False, (Simple, (Label => None))), T7 => (True, (Simple, (Int, Ada_Indent)),
(Simple, (Int, Ada_Indent))), T8 => (False, (Simple, (Label => None))), T9 => (True, (Simple, (Int,
Ada_Indent)), (Simple, (Int, Ada_Indent))), T10 => (False, (Simple, (Label => None))), T11 => (False, (Simple,
(Int, Ada_Indent_Broken))), T12 => (False, (Simple, (Int, Ada_Indent_Broken)))));
end case;
end entry_body_1;
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
is
pragma Unreferenced (Nonterm, Recover_Active);
T2 : constant SAL.Peek_Type := 2;
T11 : constant SAL.Peek_Type := 10;
begin
return Match_Names (Tree, Tokens, T2, T11, End_Names_Optional);
end entry_body_1_check;
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)
is
Parse_Data : Wisi.Parse_Data_Type renames Wisi.Parse_Data_Type (User_Data);
T1 : constant SAL.Peek_Type := 1;
T2 : constant SAL.Peek_Type := 2;
T3 : constant SAL.Peek_Type := 3;
T4 : constant SAL.Peek_Type := 4;
begin
case Parse_Data.Post_Parse_Action is
when Navigate =>
null;
when Face =>
null;
when Indent =>
Indent_Action_0 (Parse_Data, Tree, Nonterm, (T1 => (False, (Simple, (Label => None))), T2 => (False, (Simple,
(Anchored_0, T1, 1))), T3 => (False, (Simple, (Anchored_0, T1, 0))), T4 => (False, (Simple, (Label =>
None)))));
end case;
end entry_body_formal_part_0;
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)
is
Parse_Data : Wisi.Parse_Data_Type renames Wisi.Parse_Data_Type (User_Data);
T4 : constant SAL.Peek_Type := 1;
begin
case Parse_Data.Post_Parse_Action is
when Navigate =>
null;
when Face =>
null;
when Indent =>
Indent_Action_0 (Parse_Data, Tree, Nonterm, (T4 => (False, (Simple, (Label => None)))));
end case;
end entry_body_formal_part_1;
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)
is
Parse_Data : Wisi.Parse_Data_Type renames Wisi.Parse_Data_Type (User_Data);
T1 : constant SAL.Peek_Type := 1;
T2 : constant SAL.Peek_Type := 2;
begin
case Parse_Data.Post_Parse_Action is
when Navigate =>
Statement_Action (Parse_Data, Tree, Nonterm, (1 => (T1, Motion)));
when Face =>
null;
when Indent =>
Indent_Action_0 (Parse_Data, Tree, Nonterm, (T1 => (False, (Simple, (Label => None))), T2 => (False,
(Hanging_2, (Int, Ada_Indent_Broken), (Int, Ada_Indent_Broken)))));
end case;
end entry_barrier_0;
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)
is
Parse_Data : Wisi.Parse_Data_Type renames Wisi.Parse_Data_Type (User_Data);
T1 : constant SAL.Peek_Type := 1;
T5 : constant SAL.Peek_Type := 5;
begin
case Parse_Data.Post_Parse_Action is
when Navigate =>
Statement_Action (Parse_Data, Tree, Nonterm, ((T1, Statement_Start), (T5, Statement_End)));
when Face =>
null;
when Indent =>
null;
end case;
end requeue_statement_0;
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)
is
Parse_Data : Wisi.Parse_Data_Type renames Wisi.Parse_Data_Type (User_Data);
T1 : constant SAL.Peek_Type := 1;
T5 : constant SAL.Peek_Type := 3;
begin
case Parse_Data.Post_Parse_Action is
when Navigate =>
Statement_Action (Parse_Data, Tree, Nonterm, ((T1, Statement_Start), (T5, Statement_End)));
when Face =>
null;
when Indent =>
null;
end case;
end requeue_statement_1;
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)
is
Parse_Data : Wisi.Parse_Data_Type renames Wisi.Parse_Data_Type (User_Data);
T1 : constant SAL.Peek_Type := 1;
T2 : constant SAL.Peek_Type := 2;
T3 : constant SAL.Peek_Type := 3;
T4 : constant SAL.Peek_Type := 4;
begin
case Parse_Data.Post_Parse_Action is
when Navigate =>
Statement_Action (Parse_Data, Tree, Nonterm, ((T1, Statement_Start), (T4, Statement_End)));
when Face =>
null;
when Indent =>
Indent_Action_0 (Parse_Data, Tree, Nonterm, (T1 => (False, (Simple, (Label => None))), T2 => (False, (Simple,
(Int, Ada_Indent_Broken))), T3 => (False, (Simple, (Int, Ada_Indent_Broken))), T4 => (False, (Simple, (Int,
Ada_Indent_Broken)))));
end case;
end delay_until_statement_0;
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)
is
Parse_Data : Wisi.Parse_Data_Type renames Wisi.Parse_Data_Type (User_Data);
T1 : constant SAL.Peek_Type := 1;
T2 : constant SAL.Peek_Type := 2;
T3 : constant SAL.Peek_Type := 3;
begin
case Parse_Data.Post_Parse_Action is
when Navigate =>
Statement_Action (Parse_Data, Tree, Nonterm, ((T1, Statement_Start), (T3, Statement_End)));
when Face =>
null;
when Indent =>
Indent_Action_0 (Parse_Data, Tree, Nonterm, (T1 => (False, (Simple, (Label => None))), T2 => (False, (Simple,
(Int, Ada_Indent_Broken))), T3 => (False, (Simple, (Int, Ada_Indent_Broken)))));
end case;
end delay_relative_statement_0;
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)
is
Parse_Data : Wisi.Parse_Data_Type renames Wisi.Parse_Data_Type (User_Data);
begin
case Parse_Data.Post_Parse_Action is
when Navigate =>
null;
when Face =>
null;
when Indent =>
Indent_Action_0 (Parse_Data, Tree, Nonterm, ((False, (Simple, (Label => None))), (False, (Simple, (Block,
Ada_Indent)))));
end case;
end guard_select_0;
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)
is
Parse_Data : Wisi.Parse_Data_Type renames Wisi.Parse_Data_Type (User_Data);
T1 : constant SAL.Peek_Type := 1;
T2 : constant SAL.Peek_Type := 2;
T3 : constant SAL.Peek_Type := 3;
begin
case Parse_Data.Post_Parse_Action is
when Navigate =>
Statement_Action (Parse_Data, Tree, Nonterm, (1 => (T2, Motion)));
Motion_Action (Parse_Data, Tree, Nonterm, (Index_ID'(T1, 48) & Index_ID'(T2, Invalid_Token_ID)));
when Face =>
null;
when Indent =>
Indent_Action_0 (Parse_Data, Tree, Nonterm, (T1 => (False, (Simple, (Label => None))), T2 => (False, (Simple,
(Int, -Ada_Indent))), T3 => (False, (Simple, (Label => None)))));
end case;
end select_alternative_list_1;
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)
is
Parse_Data : Wisi.Parse_Data_Type renames Wisi.Parse_Data_Type (User_Data);
T1 : constant SAL.Peek_Type := 1;
T2 : constant SAL.Peek_Type := 2;
T3 : constant SAL.Peek_Type := 3;
T4 : constant SAL.Peek_Type := 4;
T5 : constant SAL.Peek_Type := 5;
T6 : constant SAL.Peek_Type := 6;
T7 : constant SAL.Peek_Type := 7;
begin
case Parse_Data.Post_Parse_Action is
when Navigate =>
Statement_Action (Parse_Data, Tree, Nonterm, ((T1, Statement_Start), (T3, Motion), (T7, Statement_End)));
Motion_Action (Parse_Data, Tree, Nonterm, (Index_ID'(T1, Invalid_Token_ID) & Index_ID'(T2, 48) & Index_ID'(T3,
Invalid_Token_ID) & Index_ID'(T7, Invalid_Token_ID)));
when Face =>
null;
when Indent =>
Indent_Action_0 (Parse_Data, Tree, Nonterm, (T1 => (True, (Simple, (Label => None)), (Simple, (Int,
Ada_Indent))), T2 => (True, (Simple, (Block, Ada_Indent)), (Simple, (Int, Ada_Indent))), T3 => (False,
(Simple, (Label => None))), T4 => (True, (Simple, (Block, Ada_Indent)), (Simple, (Int, Ada_Indent))), T5 =>
(False, (Simple, (Label => None))), T6 => (False, (Simple, (Int, Ada_Indent_Broken))), T7 => (False, (Simple,
(Int, Ada_Indent_Broken)))));
end case;
end selective_accept_0;
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)
is
Parse_Data : Wisi.Parse_Data_Type renames Wisi.Parse_Data_Type (User_Data);
T1 : constant SAL.Peek_Type := 1;
T2 : constant SAL.Peek_Type := 2;
T5 : constant SAL.Peek_Type := 3;
T6 : constant SAL.Peek_Type := 4;
T7 : constant SAL.Peek_Type := 5;
begin
case Parse_Data.Post_Parse_Action is
when Navigate =>
Statement_Action (Parse_Data, Tree, Nonterm, ((T1, Statement_Start), (T7, Statement_End)));
Motion_Action (Parse_Data, Tree, Nonterm, (Index_ID'(T1, Invalid_Token_ID) & Index_ID'(T2, 48) & Index_ID'(T7,
Invalid_Token_ID)));
when Face =>
null;
when Indent =>
Indent_Action_0 (Parse_Data, Tree, Nonterm, (T1 => (True, (Simple, (Label => None)), (Simple, (Int,
Ada_Indent))), T2 => (True, (Simple, (Block, Ada_Indent)), (Simple, (Int, Ada_Indent))), T5 => (False,
(Simple, (Label => None))), T6 => (False, (Simple, (Int, Ada_Indent_Broken))), T7 => (False, (Simple, (Int,
Ada_Indent_Broken)))));
end case;
end selective_accept_1;
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)
is
Parse_Data : Wisi.Parse_Data_Type renames Wisi.Parse_Data_Type (User_Data);
T1 : constant SAL.Peek_Type := 1;
T2 : constant SAL.Peek_Type := 2;
T3 : constant SAL.Peek_Type := 3;
begin
case Parse_Data.Post_Parse_Action is
when Navigate =>
null;
when Face =>
null;
when Indent =>
Indent_Action_0 (Parse_Data, Tree, Nonterm, (T1 => (False, (Simple, (Label => None))), T2 => (False, (Simple,
(Anchored_0, T1, Ada_Indent_Broken))), T3 => (False, (Simple, (Anchored_0, T1, Ada_Indent_Broken)))));
end case;
end guard_0;
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)
is
Parse_Data : Wisi.Parse_Data_Type renames Wisi.Parse_Data_Type (User_Data);
T1 : constant SAL.Peek_Type := 1;
T2 : constant SAL.Peek_Type := 2;
begin
case Parse_Data.Post_Parse_Action is
when Navigate =>
Statement_Action (Parse_Data, Tree, Nonterm, ((T1, Statement_Start), (T2, Statement_End)));
when Face =>
null;
when Indent =>
Indent_Action_0 (Parse_Data, Tree, Nonterm, (T1 => (False, (Simple, (Label => None))), T2 => (False, (Simple,
(Int, Ada_Indent_Broken)))));
end case;
end terminate_alternative_0;
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)
is
Parse_Data : Wisi.Parse_Data_Type renames Wisi.Parse_Data_Type (User_Data);
T1 : constant SAL.Peek_Type := 1;
T2 : constant SAL.Peek_Type := 2;
T3 : constant SAL.Peek_Type := 3;
T4 : constant SAL.Peek_Type := 4;
T5 : constant SAL.Peek_Type := 5;
T6 : constant SAL.Peek_Type := 6;
T7 : constant SAL.Peek_Type := 7;
begin
case Parse_Data.Post_Parse_Action is
when Navigate =>
Statement_Action (Parse_Data, Tree, Nonterm, ((T1, Statement_Start), (T3, Motion), (T6, Statement_End)));
Motion_Action (Parse_Data, Tree, Nonterm, (Index_ID'(T1, Invalid_Token_ID) & Index_ID'(T3, Invalid_Token_ID) &
Index_ID'(T7, Invalid_Token_ID)));
when Face =>
null;
when Indent =>
Indent_Action_0 (Parse_Data, Tree, Nonterm, (T1 => (False, (Simple, (Label => None))), T2 => (True, (Simple,
(Block, Ada_Indent)), (Simple, (Int, Ada_Indent))), T3 => (False, (Simple, (Label => None))), T4 => (True,
(Simple, (Block, Ada_Indent)), (Simple, (Int, Ada_Indent))), T5 => (False, (Simple, (Label => None))), T6 =>
(False, (Simple, (Int, Ada_Indent_Broken))), T7 => (False, (Simple, (Int, Ada_Indent_Broken)))));
end case;
end timed_entry_call_0;
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)
is
Parse_Data : Wisi.Parse_Data_Type renames Wisi.Parse_Data_Type (User_Data);
T1 : constant SAL.Peek_Type := 1;
T2 : constant SAL.Peek_Type := 2;
T3 : constant SAL.Peek_Type := 3;
T4 : constant SAL.Peek_Type := 4;
T5 : constant SAL.Peek_Type := 5;
T6 : constant SAL.Peek_Type := 6;
T7 : constant SAL.Peek_Type := 7;
begin
case Parse_Data.Post_Parse_Action is
when Navigate =>
Statement_Action (Parse_Data, Tree, Nonterm, ((T1, Statement_Start), (T3, Motion), (T7, Statement_End)));
Motion_Action (Parse_Data, Tree, Nonterm, (Index_ID'(T1, Invalid_Token_ID) & Index_ID'(T3, Invalid_Token_ID) &
Index_ID'(T7, Invalid_Token_ID)));
when Face =>
null;
when Indent =>
Indent_Action_0 (Parse_Data, Tree, Nonterm, (T1 => (False, (Simple, (Label => None))), T2 => (True, (Simple,
(Block, Ada_Indent)), (Simple, (Int, Ada_Indent))), T3 => (False, (Simple, (Label => None))), T4 => (True,
(Simple, (Block, Ada_Indent)), (Simple, (Int, Ada_Indent))), T5 => (False, (Simple, (Label => None))), T6 =>
(False, (Simple, (Int, Ada_Indent_Broken))), T7 => (False, (Simple, (Int, Ada_Indent_Broken)))));
end case;
end conditional_entry_call_0;
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)
is
Parse_Data : Wisi.Parse_Data_Type renames Wisi.Parse_Data_Type (User_Data);
T1 : constant SAL.Peek_Type := 1;
T2 : constant SAL.Peek_Type := 2;
T3 : constant SAL.Peek_Type := 3;
T4 : constant SAL.Peek_Type := 4;
T5 : constant SAL.Peek_Type := 5;
T6 : constant SAL.Peek_Type := 6;
T7 : constant SAL.Peek_Type := 7;
T8 : constant SAL.Peek_Type := 8;
begin
case Parse_Data.Post_Parse_Action is
when Navigate =>
Statement_Action (Parse_Data, Tree, Nonterm, ((T1, Statement_Start), (T3, Motion), (T8, Statement_End)));
Motion_Action (Parse_Data, Tree, Nonterm, (Index_ID'(T1, Invalid_Token_ID) & Index_ID'(T3, Invalid_Token_ID) &
Index_ID'(T8, Invalid_Token_ID)));
when Face =>
null;
when Indent =>
Indent_Action_0 (Parse_Data, Tree, Nonterm, (T1 => (False, (Simple, (Label => None))), T2 => (True, (Simple,
(Block, Ada_Indent)), (Simple, (Int, Ada_Indent))), T3 => (True, (Simple, (Label => None)), (Simple, (Int,
Ada_Indent_Broken))), T4 => (False, (Simple, (Int, Ada_Indent_Broken))), T5 => (True, (Simple, (Block,
Ada_Indent)), (Simple, (Int, Ada_Indent))), T6 => (False, (Simple, (Label => None))), T7 => (False, (Simple,
(Int, Ada_Indent_Broken))), T8 => (False, (Simple, (Int, Ada_Indent_Broken)))));
end case;
end asynchronous_select_0;
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)
is
Parse_Data : Wisi.Parse_Data_Type renames Wisi.Parse_Data_Type (User_Data);
T1 : constant SAL.Peek_Type := 1;
begin
case Parse_Data.Post_Parse_Action is
when Navigate =>
Statement_Action (Parse_Data, Tree, Nonterm, (1 => (T1, Statement_Start)));
when Face =>
null;
when Indent =>
null;
end case;
end abort_statement_0;
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)
is
Parse_Data : Wisi.Parse_Data_Type renames Wisi.Parse_Data_Type (User_Data);
begin
case Parse_Data.Post_Parse_Action is
when Navigate =>
null;
when Face =>
null;
when Indent =>
Indent_Action_0 (Parse_Data, Tree, Nonterm, (1 => (True, (Simple, (Int, 0)), (Simple, (Int, 0)))));
end case;
end compilation_0;
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
is
pragma Unreferenced (Tokens);
begin
return Terminate_Partial_Parse (Tree, Partial_Parse_Active, Partial_Parse_Byte_Goal, Recover_Active, Nonterm);
end compilation_0_check;
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)
is
Parse_Data : Wisi.Parse_Data_Type renames Wisi.Parse_Data_Type (User_Data);
begin
case Parse_Data.Post_Parse_Action is
when Navigate =>
null;
when Face =>
null;
when Indent =>
Indent_Action_0 (Parse_Data, Tree, Nonterm, ((False, (Simple, (Int, 0))), (True, (Simple, (Int, 0)), (Simple,
(Int, 0)))));
end case;
end compilation_1;
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)
is
Parse_Data : Wisi.Parse_Data_Type renames Wisi.Parse_Data_Type (User_Data);
T1 : constant SAL.Peek_Type := 1;
T2 : constant SAL.Peek_Type := 2;
begin
case Parse_Data.Post_Parse_Action is
when Navigate =>
null;
when Face =>
null;
when Indent =>
Indent_Action_0 (Parse_Data, Tree, Nonterm, (T1 => (False, (Simple, (Int, 0))), T2 => (False, (Simple, (Int,
0)))));
end case;
end compilation_unit_1;
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)
is
Parse_Data : Wisi.Parse_Data_Type renames Wisi.Parse_Data_Type (User_Data);
T2 : constant SAL.Peek_Type := 1;
begin
case Parse_Data.Post_Parse_Action is
when Navigate =>
null;
when Face =>
null;
when Indent =>
Indent_Action_0 (Parse_Data, Tree, Nonterm, (T2 => (False, (Simple, (Int, 0)))));
end case;
end compilation_unit_2;
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)
is
Parse_Data : Wisi.Parse_Data_Type renames Wisi.Parse_Data_Type (User_Data);
T1 : constant SAL.Peek_Type := 1;
T2 : constant SAL.Peek_Type := 2;
T3 : constant SAL.Peek_Type := 3;
T4 : constant SAL.Peek_Type := 4;
T5 : constant SAL.Peek_Type := 5;
begin
case Parse_Data.Post_Parse_Action is
when Navigate =>
Statement_Action (Parse_Data, Tree, Nonterm, ((T1, Statement_Start), (T5, Statement_End)));
when Face =>
Face_Apply_List_Action (Parse_Data, Tree, Nonterm, (1 => (T4, 1, 1)));
when Indent =>
Indent_Action_0 (Parse_Data, Tree, Nonterm, (T1 => (False, (Simple, (Label => None))), T2 => (False, (Simple,
(Int, Ada_Indent_Broken))), T3 => (False, (Simple, (Int, Ada_Indent_Broken))), T4 => (False, (Simple, (Int,
Ada_Indent_With))), T5 => (False, (Simple, (Int, Ada_Indent_Broken)))));
end case;
end limited_with_clause_0;
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)
is
Parse_Data : Wisi.Parse_Data_Type renames Wisi.Parse_Data_Type (User_Data);
T1 : constant SAL.Peek_Type := 1;
T3 : constant SAL.Peek_Type := 2;
T4 : constant SAL.Peek_Type := 3;
T5 : constant SAL.Peek_Type := 4;
begin
case Parse_Data.Post_Parse_Action is
when Navigate =>
Statement_Action (Parse_Data, Tree, Nonterm, ((T1, Statement_Start), (T5, Statement_End)));
when Face =>
Face_Apply_List_Action (Parse_Data, Tree, Nonterm, (1 => (T4, 1, 1)));
when Indent =>
Indent_Action_0 (Parse_Data, Tree, Nonterm, (T1 => (False, (Simple, (Label => None))), T3 => (False, (Simple,
(Int, Ada_Indent_Broken))), T4 => (False, (Simple, (Int, Ada_Indent_With))), T5 => (False, (Simple, (Int,
Ada_Indent_Broken)))));
end case;
end limited_with_clause_1;
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)
is
Parse_Data : Wisi.Parse_Data_Type renames Wisi.Parse_Data_Type (User_Data);
T1 : constant SAL.Peek_Type := 1;
T2 : constant SAL.Peek_Type := 2;
T3 : constant SAL.Peek_Type := 3;
T4 : constant SAL.Peek_Type := 4;
begin
case Parse_Data.Post_Parse_Action is
when Navigate =>
Statement_Action (Parse_Data, Tree, Nonterm, ((T1, Statement_Start), (T2, Statement_Override), (T4,
Statement_End)));
when Face =>
Face_Apply_List_Action (Parse_Data, Tree, Nonterm, (1 => (T3, 1, 1)));
when Indent =>
Indent_Action_0 (Parse_Data, Tree, Nonterm, (T1 => (False, (Simple, (Label => None))), T2 => (False, (Simple,
(Label => None))), T3 => (False, (Simple, (Int, Ada_Indent_With))), T4 => (False, (Simple, (Int,
Ada_Indent_Broken)))));
end case;
end nonlimited_with_clause_0;
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)
is
Parse_Data : Wisi.Parse_Data_Type renames Wisi.Parse_Data_Type (User_Data);
T2 : constant SAL.Peek_Type := 1;
T3 : constant SAL.Peek_Type := 2;
T4 : constant SAL.Peek_Type := 3;
begin
case Parse_Data.Post_Parse_Action is
when Navigate =>
Statement_Action (Parse_Data, Tree, Nonterm, ((T2, Statement_Override), (T4, Statement_End)));
when Face =>
Face_Apply_List_Action (Parse_Data, Tree, Nonterm, (1 => (T3, 1, 1)));
when Indent =>
Indent_Action_0 (Parse_Data, Tree, Nonterm, (T2 => (False, (Simple, (Label => None))), T3 => (False, (Simple,
(Int, Ada_Indent_With))), T4 => (False, (Simple, (Int, Ada_Indent_Broken)))));
end case;
end nonlimited_with_clause_1;
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)
is
Parse_Data : Wisi.Parse_Data_Type renames Wisi.Parse_Data_Type (User_Data);
T1 : constant SAL.Peek_Type := 1;
T2 : constant SAL.Peek_Type := 2;
T3 : constant SAL.Peek_Type := 3;
T4 : constant SAL.Peek_Type := 4;
T5 : constant SAL.Peek_Type := 5;
T6 : constant SAL.Peek_Type := 6;
begin
case Parse_Data.Post_Parse_Action is
when Navigate =>
Statement_Action (Parse_Data, Tree, Nonterm, ((T1, Statement_Start), (T2, Statement_Override), (T6,
Statement_End)));
when Face =>
null;
when Indent =>
Indent_Action_0 (Parse_Data, Tree, Nonterm, (T1 => (False, (Simple, (Label => None))), T2 => (False, (Simple,
(Label => None))), T3 => (False, (Simple, (Label => None))), T4 => (False, (Simple, (Int,
Ada_Indent_Broken))), T5 => (False, (Simple, (Label => None))), T6 => (False, (Simple, (Int,
Ada_Indent_Broken)))));
end case;
end subprogram_body_stub_0;
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)
is
Parse_Data : Wisi.Parse_Data_Type renames Wisi.Parse_Data_Type (User_Data);
T1 : constant SAL.Peek_Type := 1;
T2 : constant SAL.Peek_Type := 2;
T3 : constant SAL.Peek_Type := 3;
T4 : constant SAL.Peek_Type := 4;
T6 : constant SAL.Peek_Type := 5;
begin
case Parse_Data.Post_Parse_Action is
when Navigate =>
Statement_Action (Parse_Data, Tree, Nonterm, ((T1, Statement_Start), (T2, Statement_Override), (T6,
Statement_End)));
when Face =>
null;
when Indent =>
Indent_Action_0 (Parse_Data, Tree, Nonterm, (T1 => (False, (Simple, (Label => None))), T2 => (False, (Simple,
(Label => None))), T3 => (False, (Simple, (Label => None))), T4 => (False, (Simple, (Int,
Ada_Indent_Broken))), T6 => (False, (Simple, (Int, Ada_Indent_Broken)))));
end case;
end subprogram_body_stub_1;
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)
is
Parse_Data : Wisi.Parse_Data_Type renames Wisi.Parse_Data_Type (User_Data);
T2 : constant SAL.Peek_Type := 1;
T3 : constant SAL.Peek_Type := 2;
T4 : constant SAL.Peek_Type := 3;
T5 : constant SAL.Peek_Type := 4;
T6 : constant SAL.Peek_Type := 5;
begin
case Parse_Data.Post_Parse_Action is
when Navigate =>
Statement_Action (Parse_Data, Tree, Nonterm, ((T2, Statement_Override), (T6, Statement_End)));
when Face =>
null;
when Indent =>
Indent_Action_0 (Parse_Data, Tree, Nonterm, (T2 => (False, (Simple, (Label => None))), T3 => (False, (Simple,
(Label => None))), T4 => (False, (Simple, (Int, Ada_Indent_Broken))), T5 => (False, (Simple, (Label =>
None))), T6 => (False, (Simple, (Int, Ada_Indent_Broken)))));
end case;
end subprogram_body_stub_2;
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)
is
Parse_Data : Wisi.Parse_Data_Type renames Wisi.Parse_Data_Type (User_Data);
T2 : constant SAL.Peek_Type := 1;
T3 : constant SAL.Peek_Type := 2;
T4 : constant SAL.Peek_Type := 3;
T6 : constant SAL.Peek_Type := 4;
begin
case Parse_Data.Post_Parse_Action is
when Navigate =>
Statement_Action (Parse_Data, Tree, Nonterm, ((T2, Statement_Override), (T6, Statement_End)));
when Face =>
null;
when Indent =>
Indent_Action_0 (Parse_Data, Tree, Nonterm, (T2 => (False, (Simple, (Label => None))), T3 => (False, (Simple,
(Label => None))), T4 => (False, (Simple, (Int, Ada_Indent_Broken))), T6 => (False, (Simple, (Int,
Ada_Indent_Broken)))));
end case;
end subprogram_body_stub_3;
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)
is
Parse_Data : Wisi.Parse_Data_Type renames Wisi.Parse_Data_Type (User_Data);
T1 : constant SAL.Peek_Type := 1;
T2 : constant SAL.Peek_Type := 2;
T3 : constant SAL.Peek_Type := 3;
T4 : constant SAL.Peek_Type := 4;
T5 : constant SAL.Peek_Type := 5;
T6 : constant SAL.Peek_Type := 6;
T7 : constant SAL.Peek_Type := 7;
begin
case Parse_Data.Post_Parse_Action is
when Navigate =>
Statement_Action (Parse_Data, Tree, Nonterm, ((T1, Statement_Start), (T7, Statement_End)));
Name_Action (Parse_Data, Tree, Nonterm, T3);
when Face =>
Face_Apply_Action (Parse_Data, Tree, Nonterm, (1 => (T3, 1, 1)));
when Indent =>
Indent_Action_0 (Parse_Data, Tree, Nonterm, (T1 => (False, (Simple, (Label => None))), T2 => (False, (Simple,
(Int, Ada_Indent_Broken))), T3 => (False, (Simple, (Int, Ada_Indent_Broken))), T4 => (False, (Simple, (Label
=> None))), T5 => (False, (Simple, (Int, Ada_Indent_Broken))), T6 => (False, (Simple, (Label => None))), T7 =>
(False, (Simple, (Int, Ada_Indent_Broken)))));
end case;
end package_body_stub_0;
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)
is
Parse_Data : Wisi.Parse_Data_Type renames Wisi.Parse_Data_Type (User_Data);
T1 : constant SAL.Peek_Type := 1;
T2 : constant SAL.Peek_Type := 2;
T3 : constant SAL.Peek_Type := 3;
T4 : constant SAL.Peek_Type := 4;
T5 : constant SAL.Peek_Type := 5;
T7 : constant SAL.Peek_Type := 6;
begin
case Parse_Data.Post_Parse_Action is
when Navigate =>
Statement_Action (Parse_Data, Tree, Nonterm, ((T1, Statement_Start), (T7, Statement_End)));
Name_Action (Parse_Data, Tree, Nonterm, T3);
when Face =>
Face_Apply_Action (Parse_Data, Tree, Nonterm, (1 => (T3, 1, 1)));
when Indent =>
Indent_Action_0 (Parse_Data, Tree, Nonterm, (T1 => (False, (Simple, (Label => None))), T2 => (False, (Simple,
(Int, Ada_Indent_Broken))), T3 => (False, (Simple, (Int, Ada_Indent_Broken))), T4 => (False, (Simple, (Label
=> None))), T5 => (False, (Simple, (Int, Ada_Indent_Broken))), T7 => (False, (Simple, (Int,
Ada_Indent_Broken)))));
end case;
end package_body_stub_1;
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)
is
Parse_Data : Wisi.Parse_Data_Type renames Wisi.Parse_Data_Type (User_Data);
T1 : constant SAL.Peek_Type := 1;
T2 : constant SAL.Peek_Type := 2;
T3 : constant SAL.Peek_Type := 3;
T4 : constant SAL.Peek_Type := 4;
T5 : constant SAL.Peek_Type := 5;
T6 : constant SAL.Peek_Type := 6;
T7 : constant SAL.Peek_Type := 7;
begin
case Parse_Data.Post_Parse_Action is
when Navigate =>
Statement_Action (Parse_Data, Tree, Nonterm, ((T1, Statement_Start), (T7, Statement_End)));
Name_Action (Parse_Data, Tree, Nonterm, T3);
when Face =>
Face_Apply_Action (Parse_Data, Tree, Nonterm, (1 => (T3, 3, 2)));
when Indent =>
Indent_Action_0 (Parse_Data, Tree, Nonterm, (T1 => (False, (Simple, (Label => None))), T2 => (False, (Simple,
(Label => None))), T3 => (False, (Simple, (Int, Ada_Indent_Broken))), T4 => (False, (Simple, (Label =>
None))), T5 => (False, (Simple, (Int, Ada_Indent_Broken))), T6 => (False, (Simple, (Label => None))), T7 =>
(False, (Simple, (Int, Ada_Indent_Broken)))));
end case;
end task_body_stub_0;
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)
is
Parse_Data : Wisi.Parse_Data_Type renames Wisi.Parse_Data_Type (User_Data);
T1 : constant SAL.Peek_Type := 1;
T2 : constant SAL.Peek_Type := 2;
T3 : constant SAL.Peek_Type := 3;
T4 : constant SAL.Peek_Type := 4;
T5 : constant SAL.Peek_Type := 5;
T7 : constant SAL.Peek_Type := 6;
begin
case Parse_Data.Post_Parse_Action is
when Navigate =>
Statement_Action (Parse_Data, Tree, Nonterm, ((T1, Statement_Start), (T7, Statement_End)));
Name_Action (Parse_Data, Tree, Nonterm, T3);
when Face =>
Face_Apply_Action (Parse_Data, Tree, Nonterm, (1 => (T3, 3, 2)));
when Indent =>
Indent_Action_0 (Parse_Data, Tree, Nonterm, (T1 => (False, (Simple, (Label => None))), T2 => (False, (Simple,
(Label => None))), T3 => (False, (Simple, (Int, Ada_Indent_Broken))), T4 => (False, (Simple, (Label =>
None))), T5 => (False, (Simple, (Int, Ada_Indent_Broken))), T7 => (False, (Simple, (Int,
Ada_Indent_Broken)))));
end case;
end task_body_stub_1;
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)
is
Parse_Data : Wisi.Parse_Data_Type renames Wisi.Parse_Data_Type (User_Data);
T1 : constant SAL.Peek_Type := 1;
T2 : constant SAL.Peek_Type := 2;
T3 : constant SAL.Peek_Type := 3;
T4 : constant SAL.Peek_Type := 4;
T5 : constant SAL.Peek_Type := 5;
T6 : constant SAL.Peek_Type := 6;
T7 : constant SAL.Peek_Type := 7;
begin
case Parse_Data.Post_Parse_Action is
when Navigate =>
Statement_Action (Parse_Data, Tree, Nonterm, ((T1, Statement_Start), (T7, Statement_End)));
Name_Action (Parse_Data, Tree, Nonterm, T3);
when Face =>
Face_Apply_Action (Parse_Data, Tree, Nonterm, (1 => (T3, 3, 2)));
when Indent =>
Indent_Action_0 (Parse_Data, Tree, Nonterm, (T1 => (False, (Simple, (Label => None))), T2 => (False, (Simple,
(Int, Ada_Indent_Broken))), T3 => (False, (Simple, (Int, Ada_Indent_Broken))), T4 => (False, (Simple, (Int,
Ada_Indent_Broken))), T5 => (False, (Simple, (Int, Ada_Indent_Broken))), T6 => (False, (Simple, (Label =>
None))), T7 => (False, (Simple, (Int, Ada_Indent_Broken)))));
end case;
end protected_body_stub_0;
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)
is
Parse_Data : Wisi.Parse_Data_Type renames Wisi.Parse_Data_Type (User_Data);
T1 : constant SAL.Peek_Type := 1;
T2 : constant SAL.Peek_Type := 2;
T3 : constant SAL.Peek_Type := 3;
T4 : constant SAL.Peek_Type := 4;
T5 : constant SAL.Peek_Type := 5;
T7 : constant SAL.Peek_Type := 6;
begin
case Parse_Data.Post_Parse_Action is
when Navigate =>
Statement_Action (Parse_Data, Tree, Nonterm, ((T1, Statement_Start), (T7, Statement_End)));
Name_Action (Parse_Data, Tree, Nonterm, T3);
when Face =>
Face_Apply_Action (Parse_Data, Tree, Nonterm, (1 => (T3, 3, 2)));
when Indent =>
Indent_Action_0 (Parse_Data, Tree, Nonterm, (T1 => (False, (Simple, (Label => None))), T2 => (False, (Simple,
(Int, Ada_Indent_Broken))), T3 => (False, (Simple, (Int, Ada_Indent_Broken))), T4 => (False, (Simple, (Int,
Ada_Indent_Broken))), T5 => (False, (Simple, (Int, Ada_Indent_Broken))), T7 => (False, (Simple, (Int,
Ada_Indent_Broken)))));
end case;
end protected_body_stub_1;
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)
is
Parse_Data : Wisi.Parse_Data_Type renames Wisi.Parse_Data_Type (User_Data);
T1 : constant SAL.Peek_Type := 1;
T2 : constant SAL.Peek_Type := 2;
T3 : constant SAL.Peek_Type := 3;
T4 : constant SAL.Peek_Type := 4;
T5 : constant SAL.Peek_Type := 5;
begin
case Parse_Data.Post_Parse_Action is
when Navigate =>
Statement_Action (Parse_Data, Tree, Nonterm, (1 => (T1, Statement_Start)));
when Face =>
null;
when Indent =>
Indent_Action_0 (Parse_Data, Tree, Nonterm, (T1 => (False, (Simple, (Label => None))), T2 => (False, (Simple,
(Int, Ada_Indent_Broken))), T3 => (False, (Simple, (Anchored_0, T2, 1))), T4 => (False, (Simple, (Anchored_0,
T2, 0))), T5 => (False, (Simple, (Label => None)))));
end case;
end subunit_0;
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)
is
Parse_Data : Wisi.Parse_Data_Type renames Wisi.Parse_Data_Type (User_Data);
T1 : constant SAL.Peek_Type := 1;
T5 : constant SAL.Peek_Type := 5;
begin
case Parse_Data.Post_Parse_Action is
when Navigate =>
Statement_Action (Parse_Data, Tree, Nonterm, ((T1, Statement_Start), (T5, Statement_End)));
when Face =>
null;
when Indent =>
null;
end case;
end exception_declaration_0;
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)
is
Parse_Data : Wisi.Parse_Data_Type renames Wisi.Parse_Data_Type (User_Data);
T1 : constant SAL.Peek_Type := 1;
T5 : constant SAL.Peek_Type := 4;
begin
case Parse_Data.Post_Parse_Action is
when Navigate =>
Statement_Action (Parse_Data, Tree, Nonterm, ((T1, Statement_Start), (T5, Statement_End)));
when Face =>
null;
when Indent =>
null;
end case;
end exception_declaration_1;
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)
is
Parse_Data : Wisi.Parse_Data_Type renames Wisi.Parse_Data_Type (User_Data);
begin
case Parse_Data.Post_Parse_Action is
when Navigate =>
Statement_Action (Parse_Data, Tree, Nonterm, ((1, Motion), (2, Motion)));
Motion_Action (Parse_Data, Tree, Nonterm, (Index_ID'(1, Invalid_Token_ID) & Index_ID'(2, Invalid_Token_ID)));
when Face =>
null;
when Indent =>
null;
end case;
end exception_handler_list_2;
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)
is
Parse_Data : Wisi.Parse_Data_Type renames Wisi.Parse_Data_Type (User_Data);
T1 : constant SAL.Peek_Type := 1;
T2 : constant SAL.Peek_Type := 2;
T3 : constant SAL.Peek_Type := 3;
begin
case Parse_Data.Post_Parse_Action is
when Navigate =>
null;
when Face =>
null;
when Indent =>
Indent_Action_0 (Parse_Data, Tree, Nonterm, (T1 => (True, (Simple, (Label => None)), (Simple, (Label =>
None))), T2 => (False, (Simple, (Int, -Ada_Indent))), T3 => (True, (Simple, (Int, Ada_Indent_When -
Ada_Indent)), (Simple, (Int, Ada_Indent_When - Ada_Indent)))));
end case;
end handled_sequence_of_statements_0;
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)
is
Parse_Data : Wisi.Parse_Data_Type renames Wisi.Parse_Data_Type (User_Data);
T1 : constant SAL.Peek_Type := 1;
begin
case Parse_Data.Post_Parse_Action is
when Navigate =>
null;
when Face =>
null;
when Indent =>
Indent_Action_0 (Parse_Data, Tree, Nonterm, (T1 => (True, (Simple, (Label => None)), (Simple, (Label =>
None)))));
end case;
end handled_sequence_of_statements_1;
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)
is
Parse_Data : Wisi.Parse_Data_Type renames Wisi.Parse_Data_Type (User_Data);
T1 : constant SAL.Peek_Type := 1;
T2 : constant SAL.Peek_Type := 2;
T3 : constant SAL.Peek_Type := 3;
T4 : constant SAL.Peek_Type := 4;
T5 : constant SAL.Peek_Type := 5;
T6 : constant SAL.Peek_Type := 6;
begin
case Parse_Data.Post_Parse_Action is
when Navigate =>
Statement_Action (Parse_Data, Tree, Nonterm, (1 => (T1, Motion)));
when Face =>
null;
when Indent =>
Indent_Action_0 (Parse_Data, Tree, Nonterm, (T1 => (False, (Simple, (Label => None))), T2 => (False, (Simple,
(Int, Ada_Indent_Broken))), T3 => (False, (Simple, (Int, Ada_Indent_Broken))), T4 => (False, (Simple, (Int,
Ada_Indent_Broken))), T5 => (False, (Simple, (Int, Ada_Indent_Broken))), T6 => (True, (Simple, (Block,
Ada_Indent)), (Simple, (Int, Ada_Indent)))));
end case;
end exception_handler_0;
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)
is
Parse_Data : Wisi.Parse_Data_Type renames Wisi.Parse_Data_Type (User_Data);
T1 : constant SAL.Peek_Type := 1;
T4 : constant SAL.Peek_Type := 2;
T5 : constant SAL.Peek_Type := 3;
T6 : constant SAL.Peek_Type := 4;
begin
case Parse_Data.Post_Parse_Action is
when Navigate =>
Statement_Action (Parse_Data, Tree, Nonterm, (1 => (T1, Motion)));
when Face =>
null;
when Indent =>
Indent_Action_0 (Parse_Data, Tree, Nonterm, (T1 => (False, (Simple, (Label => None))), T4 => (False, (Simple,
(Int, Ada_Indent_Broken))), T5 => (False, (Simple, (Int, Ada_Indent_Broken))), T6 => (True, (Simple, (Block,
Ada_Indent)), (Simple, (Int, Ada_Indent)))));
end case;
end exception_handler_1;
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)
is
Parse_Data : Wisi.Parse_Data_Type renames Wisi.Parse_Data_Type (User_Data);
T1 : constant SAL.Peek_Type := 1;
T2 : constant SAL.Peek_Type := 2;
begin
case Parse_Data.Post_Parse_Action is
when Navigate =>
Statement_Action (Parse_Data, Tree, Nonterm, ((T1, Statement_Start), (T2, Statement_End)));
when Face =>
null;
when Indent =>
null;
end case;
end raise_statement_0;
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)
is
Parse_Data : Wisi.Parse_Data_Type renames Wisi.Parse_Data_Type (User_Data);
T1 : constant SAL.Peek_Type := 1;
T2 : constant SAL.Peek_Type := 2;
T3 : constant SAL.Peek_Type := 3;
T4 : constant SAL.Peek_Type := 4;
T5 : constant SAL.Peek_Type := 5;
begin
case Parse_Data.Post_Parse_Action is
when Navigate =>
Statement_Action (Parse_Data, Tree, Nonterm, ((T1, Statement_Start), (T5, Statement_End)));
when Face =>
null;
when Indent =>
Indent_Action_0 (Parse_Data, Tree, Nonterm, (T1 => (False, (Simple, (Label => None))), T2 => (False,
(Hanging_2, (Int, Ada_Indent_Broken), (Int, Ada_Indent_Broken))), T3 => (False, (Simple, (Int,
Ada_Indent_Broken))), T4 => (False, (Simple, (Anchored_1, T3, Ada_Indent_Broken))), T5 => (False, (Simple,
(Int, Ada_Indent_Broken)))));
end case;
end raise_statement_1;
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)
is
Parse_Data : Wisi.Parse_Data_Type renames Wisi.Parse_Data_Type (User_Data);
T1 : constant SAL.Peek_Type := 1;
T2 : constant SAL.Peek_Type := 2;
T5 : constant SAL.Peek_Type := 3;
begin
case Parse_Data.Post_Parse_Action is
when Navigate =>
Statement_Action (Parse_Data, Tree, Nonterm, ((T1, Statement_Start), (T5, Statement_End)));
when Face =>
null;
when Indent =>
Indent_Action_0 (Parse_Data, Tree, Nonterm, (T1 => (False, (Simple, (Label => None))), T2 => (False,
(Hanging_2, (Int, Ada_Indent_Broken), (Int, Ada_Indent_Broken))), T5 => (False, (Simple, (Int,
Ada_Indent_Broken)))));
end case;
end raise_statement_2;
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)
is
Parse_Data : Wisi.Parse_Data_Type renames Wisi.Parse_Data_Type (User_Data);
T1 : constant SAL.Peek_Type := 1;
T2 : constant SAL.Peek_Type := 2;
T3 : constant SAL.Peek_Type := 3;
T4 : constant SAL.Peek_Type := 4;
begin
case Parse_Data.Post_Parse_Action is
when Navigate =>
null;
when Face =>
null;
when Indent =>
Indent_Action_0 (Parse_Data, Tree, Nonterm, (T1 => (False, (Simple, (Label => None))), T2 => (False, (Simple,
(Int, Ada_Indent_Broken))), T3 => (False, (Simple, (Int, Ada_Indent_Broken))), T4 => (False, (Simple, (Int,
Ada_Indent_Broken)))));
end case;
end raise_expression_0;
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)
is
Parse_Data : Wisi.Parse_Data_Type renames Wisi.Parse_Data_Type (User_Data);
T1 : constant SAL.Peek_Type := 1;
T2 : constant SAL.Peek_Type := 2;
begin
case Parse_Data.Post_Parse_Action is
when Navigate =>
null;
when Face =>
null;
when Indent =>
Indent_Action_0 (Parse_Data, Tree, Nonterm, (T1 => (False, (Simple, (Label => None))), T2 => (False, (Simple,
(Int, Ada_Indent_Broken)))));
end case;
end raise_expression_1;
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)
is
Parse_Data : Wisi.Parse_Data_Type renames Wisi.Parse_Data_Type (User_Data);
T1 : constant SAL.Peek_Type := 1;
T2 : constant SAL.Peek_Type := 2;
T4 : constant SAL.Peek_Type := 4;
begin
case Parse_Data.Post_Parse_Action is
when Navigate =>
Statement_Action (Parse_Data, Tree, Nonterm, ((T1, Statement_Start), (T2, Statement_Override), (T4,
Statement_End)));
Motion_Action (Parse_Data, Tree, Nonterm, (Index_ID'(T1, Invalid_Token_ID) & Index_ID'(T2, Invalid_Token_ID) &
Index_ID'(T4, Invalid_Token_ID)));
when Face =>
null;
when Indent =>
null;
end case;
end generic_subprogram_declaration_0;
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)
is
Parse_Data : Wisi.Parse_Data_Type renames Wisi.Parse_Data_Type (User_Data);
T1 : constant SAL.Peek_Type := 1;
T2 : constant SAL.Peek_Type := 2;
T4 : constant SAL.Peek_Type := 3;
begin
case Parse_Data.Post_Parse_Action is
when Navigate =>
Statement_Action (Parse_Data, Tree, Nonterm, ((T1, Statement_Start), (T2, Statement_Override), (T4,
Statement_End)));
Motion_Action (Parse_Data, Tree, Nonterm, (Index_ID'(T1, Invalid_Token_ID) & Index_ID'(T2, Invalid_Token_ID) &
Index_ID'(T4, Invalid_Token_ID)));
when Face =>
null;
when Indent =>
null;
end case;
end generic_subprogram_declaration_1;
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)
is
Parse_Data : Wisi.Parse_Data_Type renames Wisi.Parse_Data_Type (User_Data);
T1 : constant SAL.Peek_Type := 1;
T2 : constant SAL.Peek_Type := 2;
T3 : constant SAL.Peek_Type := 3;
begin
case Parse_Data.Post_Parse_Action is
when Navigate =>
Statement_Action (Parse_Data, Tree, Nonterm, ((T1, Statement_Start), (T3, Statement_End)));
Motion_Action (Parse_Data, Tree, Nonterm, (Index_ID'(T1, Invalid_Token_ID) & Index_ID'(T2, Invalid_Token_ID) &
Index_ID'(T3, Invalid_Token_ID)));
when Face =>
null;
when Indent =>
Indent_Action_0 (Parse_Data, Tree, Nonterm, (T1 => (True, (Simple, (Label => None)), (Simple, (Int,
Ada_Indent))), T2 => (False, (Simple, (Label => None))), T3 => (False, (Simple, (Int, Ada_Indent_Broken)))));
end case;
end generic_package_declaration_0;
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)
is
Parse_Data : Wisi.Parse_Data_Type renames Wisi.Parse_Data_Type (User_Data);
T1 : constant SAL.Peek_Type := 1;
T2 : constant SAL.Peek_Type := 2;
begin
case Parse_Data.Post_Parse_Action is
when Navigate =>
Statement_Action (Parse_Data, Tree, Nonterm, (1 => (T1, Statement_Start)));
when Face =>
null;
when Indent =>
Indent_Action_0 (Parse_Data, Tree, Nonterm, (T1 => (False, (Simple, (Label => None))), T2 => (False, (Simple,
(Block, Ada_Indent)))));
end case;
end generic_formal_part_0;
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)
is
Parse_Data : Wisi.Parse_Data_Type renames Wisi.Parse_Data_Type (User_Data);
T1 : constant SAL.Peek_Type := 1;
begin
case Parse_Data.Post_Parse_Action is
when Navigate =>
Statement_Action (Parse_Data, Tree, Nonterm, (1 => (T1, Statement_Start)));
when Face =>
null;
when Indent =>
Indent_Action_0 (Parse_Data, Tree, Nonterm, (T1 => (False, (Simple, (Label => None)))));
end case;
end generic_formal_part_1;
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)
is
Parse_Data : Wisi.Parse_Data_Type renames Wisi.Parse_Data_Type (User_Data);
T1 : constant SAL.Peek_Type := 1;
T2 : constant SAL.Peek_Type := 2;
T3 : constant SAL.Peek_Type := 3;
T4 : constant SAL.Peek_Type := 4;
T5 : constant SAL.Peek_Type := 5;
T6 : constant SAL.Peek_Type := 6;
T7 : constant SAL.Peek_Type := 7;
begin
case Parse_Data.Post_Parse_Action is
when Navigate =>
Statement_Action (Parse_Data, Tree, Nonterm, ((T1, Statement_Start), (T7, Statement_End)));
Name_Action (Parse_Data, Tree, Nonterm, T2);
when Face =>
Face_Apply_Action (Parse_Data, Tree, Nonterm, (1 => (T2, 1, 1)));
when Indent =>
Indent_Action_0 (Parse_Data, Tree, Nonterm, (T1 => (False, (Simple, (Label => None))), T2 => (False,
(Hanging_2, (Int, Ada_Indent_Broken), (Int, Ada_Indent_Broken))), T3 => (False, (Simple, (Label => None))), T4
=> (False, (Simple, (Int, Ada_Indent_Broken))), T5 => (False, (Hanging_2, (Int, Ada_Indent_Broken), (Int,
Ada_Indent_Broken))), T6 => (False, (Simple, (Label => None))), T7 => (False, (Simple, (Int,
Ada_Indent_Broken)))));
end case;
end generic_instantiation_0;
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)
is
Parse_Data : Wisi.Parse_Data_Type renames Wisi.Parse_Data_Type (User_Data);
T1 : constant SAL.Peek_Type := 1;
T2 : constant SAL.Peek_Type := 2;
T3 : constant SAL.Peek_Type := 3;
T4 : constant SAL.Peek_Type := 4;
T5 : constant SAL.Peek_Type := 5;
T7 : constant SAL.Peek_Type := 6;
begin
case Parse_Data.Post_Parse_Action is
when Navigate =>
Statement_Action (Parse_Data, Tree, Nonterm, ((T1, Statement_Start), (T7, Statement_End)));
Name_Action (Parse_Data, Tree, Nonterm, T2);
when Face =>
Face_Apply_Action (Parse_Data, Tree, Nonterm, (1 => (T2, 1, 1)));
when Indent =>
Indent_Action_0 (Parse_Data, Tree, Nonterm, (T1 => (False, (Simple, (Label => None))), T2 => (False,
(Hanging_2, (Int, Ada_Indent_Broken), (Int, Ada_Indent_Broken))), T3 => (False, (Simple, (Label => None))), T4
=> (False, (Simple, (Int, Ada_Indent_Broken))), T5 => (False, (Hanging_2, (Int, Ada_Indent_Broken), (Int,
Ada_Indent_Broken))), T7 => (False, (Simple, (Int, Ada_Indent_Broken)))));
end case;
end generic_instantiation_1;
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)
is
Parse_Data : Wisi.Parse_Data_Type renames Wisi.Parse_Data_Type (User_Data);
T1 : constant SAL.Peek_Type := 1;
T2 : constant SAL.Peek_Type := 2;
T3 : constant SAL.Peek_Type := 3;
T4 : constant SAL.Peek_Type := 4;
T5 : constant SAL.Peek_Type := 5;
T6 : constant SAL.Peek_Type := 6;
T7 : constant SAL.Peek_Type := 7;
T8 : constant SAL.Peek_Type := 8;
begin
case Parse_Data.Post_Parse_Action is
when Navigate =>
Statement_Action (Parse_Data, Tree, Nonterm, ((T1, Statement_Start), (T2, Statement_Override), (T8,
Statement_End)));
Name_Action (Parse_Data, Tree, Nonterm, T3);
when Face =>
Face_Apply_Action (Parse_Data, Tree, Nonterm, (1 => (T3, 1, 1)));
when Indent =>
Indent_Action_0 (Parse_Data, Tree, Nonterm, (T1 => (False, (Simple, (Label => None))), T2 => (False, (Simple,
(Label => None))), T3 => (False, (Hanging_2, (Int, Ada_Indent_Broken), (Int, Ada_Indent_Broken))), T4 =>
(False, (Simple, (Int, Ada_Indent_Broken))), T5 => (False, (Simple, (Int, Ada_Indent_Broken))), T6 => (False,
(Hanging_2, (Int, Ada_Indent_Broken), (Int, Ada_Indent_Broken))), T7 => (False, (Simple, (Label => None))), T8
=> (False, (Simple, (Int, Ada_Indent_Broken)))));
end case;
end generic_instantiation_2;
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)
is
Parse_Data : Wisi.Parse_Data_Type renames Wisi.Parse_Data_Type (User_Data);
T1 : constant SAL.Peek_Type := 1;
T2 : constant SAL.Peek_Type := 2;
T3 : constant SAL.Peek_Type := 3;
T4 : constant SAL.Peek_Type := 4;
T5 : constant SAL.Peek_Type := 5;
T6 : constant SAL.Peek_Type := 6;
T8 : constant SAL.Peek_Type := 7;
begin
case Parse_Data.Post_Parse_Action is
when Navigate =>
Statement_Action (Parse_Data, Tree, Nonterm, ((T1, Statement_Start), (T2, Statement_Override), (T8,
Statement_End)));
Name_Action (Parse_Data, Tree, Nonterm, T3);
when Face =>
Face_Apply_Action (Parse_Data, Tree, Nonterm, (1 => (T3, 1, 1)));
when Indent =>
Indent_Action_0 (Parse_Data, Tree, Nonterm, (T1 => (False, (Simple, (Label => None))), T2 => (False, (Simple,
(Label => None))), T3 => (False, (Hanging_2, (Int, Ada_Indent_Broken), (Int, Ada_Indent_Broken))), T4 =>
(False, (Simple, (Int, Ada_Indent_Broken))), T5 => (False, (Simple, (Int, Ada_Indent_Broken))), T6 => (False,
(Hanging_2, (Int, Ada_Indent_Broken), (Int, Ada_Indent_Broken))), T8 => (False, (Simple, (Int,
Ada_Indent_Broken)))));
end case;
end generic_instantiation_3;
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)
is
Parse_Data : Wisi.Parse_Data_Type renames Wisi.Parse_Data_Type (User_Data);
T2 : constant SAL.Peek_Type := 1;
T3 : constant SAL.Peek_Type := 2;
T4 : constant SAL.Peek_Type := 3;
T5 : constant SAL.Peek_Type := 4;
T6 : constant SAL.Peek_Type := 5;
T7 : constant SAL.Peek_Type := 6;
T8 : constant SAL.Peek_Type := 7;
begin
case Parse_Data.Post_Parse_Action is
when Navigate =>
Statement_Action (Parse_Data, Tree, Nonterm, ((T2, Statement_Override), (T8, Statement_End)));
Name_Action (Parse_Data, Tree, Nonterm, T3);
when Face =>
Face_Apply_Action (Parse_Data, Tree, Nonterm, (1 => (T3, 1, 1)));
when Indent =>
Indent_Action_0 (Parse_Data, Tree, Nonterm, (T2 => (False, (Simple, (Label => None))), T3 => (False,
(Hanging_2, (Int, Ada_Indent_Broken), (Int, Ada_Indent_Broken))), T4 => (False, (Simple, (Int,
Ada_Indent_Broken))), T5 => (False, (Simple, (Int, Ada_Indent_Broken))), T6 => (False, (Hanging_2, (Int,
Ada_Indent_Broken), (Int, Ada_Indent_Broken))), T7 => (False, (Simple, (Label => None))), T8 => (False,
(Simple, (Int, Ada_Indent_Broken)))));
end case;
end generic_instantiation_4;
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)
is
Parse_Data : Wisi.Parse_Data_Type renames Wisi.Parse_Data_Type (User_Data);
T2 : constant SAL.Peek_Type := 1;
T3 : constant SAL.Peek_Type := 2;
T4 : constant SAL.Peek_Type := 3;
T5 : constant SAL.Peek_Type := 4;
T6 : constant SAL.Peek_Type := 5;
T8 : constant SAL.Peek_Type := 6;
begin
case Parse_Data.Post_Parse_Action is
when Navigate =>
Statement_Action (Parse_Data, Tree, Nonterm, ((T2, Statement_Override), (T8, Statement_End)));
Name_Action (Parse_Data, Tree, Nonterm, T3);
when Face =>
Face_Apply_Action (Parse_Data, Tree, Nonterm, (1 => (T3, 1, 1)));
when Indent =>
Indent_Action_0 (Parse_Data, Tree, Nonterm, (T2 => (False, (Simple, (Label => None))), T3 => (False,
(Hanging_2, (Int, Ada_Indent_Broken), (Int, Ada_Indent_Broken))), T4 => (False, (Simple, (Int,
Ada_Indent_Broken))), T5 => (False, (Simple, (Int, Ada_Indent_Broken))), T6 => (False, (Hanging_2, (Int,
Ada_Indent_Broken), (Int, Ada_Indent_Broken))), T8 => (False, (Simple, (Int, Ada_Indent_Broken)))));
end case;
end generic_instantiation_5;
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)
is
Parse_Data : Wisi.Parse_Data_Type renames Wisi.Parse_Data_Type (User_Data);
T1 : constant SAL.Peek_Type := 1;
T2 : constant SAL.Peek_Type := 2;
T3 : constant SAL.Peek_Type := 3;
T4 : constant SAL.Peek_Type := 4;
T5 : constant SAL.Peek_Type := 5;
T6 : constant SAL.Peek_Type := 6;
T7 : constant SAL.Peek_Type := 7;
T8 : constant SAL.Peek_Type := 8;
begin
case Parse_Data.Post_Parse_Action is
when Navigate =>
Statement_Action (Parse_Data, Tree, Nonterm, ((T1, Statement_Start), (T2, Statement_Override), (T8,
Statement_End)));
Name_Action (Parse_Data, Tree, Nonterm, T3);
when Face =>
Face_Apply_Action (Parse_Data, Tree, Nonterm, (1 => (T3, 1, 1)));
when Indent =>
Indent_Action_0 (Parse_Data, Tree, Nonterm, (T1 => (False, (Simple, (Label => None))), T2 => (False, (Simple,
(Label => None))), T3 => (False, (Hanging_2, (Int, Ada_Indent_Broken), (Int, Ada_Indent_Broken))), T4 =>
(False, (Simple, (Int, Ada_Indent_Broken))), T5 => (False, (Simple, (Int, Ada_Indent_Broken))), T6 => (False,
(Hanging_2, (Int, Ada_Indent_Broken), (Int, Ada_Indent_Broken))), T7 => (False, (Simple, (Label => None))), T8
=> (False, (Simple, (Int, Ada_Indent_Broken)))));
end case;
end generic_instantiation_6;
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)
is
Parse_Data : Wisi.Parse_Data_Type renames Wisi.Parse_Data_Type (User_Data);
T1 : constant SAL.Peek_Type := 1;
T2 : constant SAL.Peek_Type := 2;
T3 : constant SAL.Peek_Type := 3;
T4 : constant SAL.Peek_Type := 4;
T5 : constant SAL.Peek_Type := 5;
T6 : constant SAL.Peek_Type := 6;
T8 : constant SAL.Peek_Type := 7;
begin
case Parse_Data.Post_Parse_Action is
when Navigate =>
Statement_Action (Parse_Data, Tree, Nonterm, ((T1, Statement_Start), (T2, Statement_Override), (T8,
Statement_End)));
Name_Action (Parse_Data, Tree, Nonterm, T3);
when Face =>
Face_Apply_Action (Parse_Data, Tree, Nonterm, (1 => (T3, 1, 1)));
when Indent =>
Indent_Action_0 (Parse_Data, Tree, Nonterm, (T1 => (False, (Simple, (Label => None))), T2 => (False, (Simple,
(Label => None))), T3 => (False, (Hanging_2, (Int, Ada_Indent_Broken), (Int, Ada_Indent_Broken))), T4 =>
(False, (Simple, (Int, Ada_Indent_Broken))), T5 => (False, (Simple, (Int, Ada_Indent_Broken))), T6 => (False,
(Hanging_2, (Int, Ada_Indent_Broken), (Int, Ada_Indent_Broken))), T8 => (False, (Simple, (Int,
Ada_Indent_Broken)))));
end case;
end generic_instantiation_7;
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)
is
Parse_Data : Wisi.Parse_Data_Type renames Wisi.Parse_Data_Type (User_Data);
T2 : constant SAL.Peek_Type := 1;
T3 : constant SAL.Peek_Type := 2;
T4 : constant SAL.Peek_Type := 3;
T5 : constant SAL.Peek_Type := 4;
T6 : constant SAL.Peek_Type := 5;
T7 : constant SAL.Peek_Type := 6;
T8 : constant SAL.Peek_Type := 7;
begin
case Parse_Data.Post_Parse_Action is
when Navigate =>
Statement_Action (Parse_Data, Tree, Nonterm, ((T2, Statement_Override), (T8, Statement_End)));
Name_Action (Parse_Data, Tree, Nonterm, T3);
when Face =>
Face_Apply_Action (Parse_Data, Tree, Nonterm, (1 => (T3, 1, 1)));
when Indent =>
Indent_Action_0 (Parse_Data, Tree, Nonterm, (T2 => (False, (Simple, (Label => None))), T3 => (False,
(Hanging_2, (Int, Ada_Indent_Broken), (Int, Ada_Indent_Broken))), T4 => (False, (Simple, (Int,
Ada_Indent_Broken))), T5 => (False, (Simple, (Int, Ada_Indent_Broken))), T6 => (False, (Hanging_2, (Int,
Ada_Indent_Broken), (Int, Ada_Indent_Broken))), T7 => (False, (Simple, (Label => None))), T8 => (False,
(Simple, (Int, Ada_Indent_Broken)))));
end case;
end generic_instantiation_8;
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)
is
Parse_Data : Wisi.Parse_Data_Type renames Wisi.Parse_Data_Type (User_Data);
T2 : constant SAL.Peek_Type := 1;
T3 : constant SAL.Peek_Type := 2;
T4 : constant SAL.Peek_Type := 3;
T5 : constant SAL.Peek_Type := 4;
T6 : constant SAL.Peek_Type := 5;
T8 : constant SAL.Peek_Type := 6;
begin
case Parse_Data.Post_Parse_Action is
when Navigate =>
Statement_Action (Parse_Data, Tree, Nonterm, ((T2, Statement_Override), (T8, Statement_End)));
Name_Action (Parse_Data, Tree, Nonterm, T3);
when Face =>
Face_Apply_Action (Parse_Data, Tree, Nonterm, (1 => (T3, 1, 1)));
when Indent =>
Indent_Action_0 (Parse_Data, Tree, Nonterm, (T2 => (False, (Simple, (Label => None))), T3 => (False,
(Hanging_2, (Int, Ada_Indent_Broken), (Int, Ada_Indent_Broken))), T4 => (False, (Simple, (Int,
Ada_Indent_Broken))), T5 => (False, (Simple, (Int, Ada_Indent_Broken))), T6 => (False, (Hanging_2, (Int,
Ada_Indent_Broken), (Int, Ada_Indent_Broken))), T8 => (False, (Simple, (Int, Ada_Indent_Broken)))));
end case;
end generic_instantiation_9;
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)
is
Parse_Data : Wisi.Parse_Data_Type renames Wisi.Parse_Data_Type (User_Data);
T1 : constant SAL.Peek_Type := 1;
T2 : constant SAL.Peek_Type := 2;
T3 : constant SAL.Peek_Type := 3;
T4 : constant SAL.Peek_Type := 4;
T5 : constant SAL.Peek_Type := 5;
T6 : constant SAL.Peek_Type := 6;
T7 : constant SAL.Peek_Type := 7;
T8 : constant SAL.Peek_Type := 8;
begin
case Parse_Data.Post_Parse_Action is
when Navigate =>
Statement_Action (Parse_Data, Tree, Nonterm, ((T1, Statement_Start), (T8, Statement_End)));
when Face =>
Face_Apply_Action (Parse_Data, Tree, Nonterm, (1 => (T5, 1, 2)));
when Indent =>
Indent_Action_0 (Parse_Data, Tree, Nonterm, (T1 => (False, (Simple, (Label => None))), T2 => (False, (Simple,
(Int, Ada_Indent_Broken))), T3 => (False, (Simple, (Int, Ada_Indent_Broken))), T4 => (False, (Simple, (Int,
Ada_Indent_Broken))), T5 => (False, (Hanging_2, (Int, Ada_Indent_Broken), (Int, Ada_Indent_Broken))), T6 =>
(False, (Hanging_1, (Anchored_1, T5, Ada_Indent_Broken), (Anchored_1, T5, 2 * Ada_Indent_Broken))), T7 =>
(False, (Simple, (Int, Ada_Indent_Broken))), T8 => (False, (Simple, (Int, Ada_Indent_Broken)))));
end case;
end formal_object_declaration_0;
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)
is
Parse_Data : Wisi.Parse_Data_Type renames Wisi.Parse_Data_Type (User_Data);
T1 : constant SAL.Peek_Type := 1;
T2 : constant SAL.Peek_Type := 2;
T3 : constant SAL.Peek_Type := 3;
T4 : constant SAL.Peek_Type := 4;
T5 : constant SAL.Peek_Type := 5;
T6 : constant SAL.Peek_Type := 6;
T8 : constant SAL.Peek_Type := 7;
begin
case Parse_Data.Post_Parse_Action is
when Navigate =>
Statement_Action (Parse_Data, Tree, Nonterm, ((T1, Statement_Start), (T8, Statement_End)));
when Face =>
Face_Apply_Action (Parse_Data, Tree, Nonterm, (1 => (T5, 1, 2)));
when Indent =>
Indent_Action_0 (Parse_Data, Tree, Nonterm, (T1 => (False, (Simple, (Label => None))), T2 => (False, (Simple,
(Int, Ada_Indent_Broken))), T3 => (False, (Simple, (Int, Ada_Indent_Broken))), T4 => (False, (Simple, (Int,
Ada_Indent_Broken))), T5 => (False, (Hanging_2, (Int, Ada_Indent_Broken), (Int, Ada_Indent_Broken))), T6 =>
(False, (Hanging_1, (Anchored_1, T5, Ada_Indent_Broken), (Anchored_1, T5, 2 * Ada_Indent_Broken))), T8 =>
(False, (Simple, (Int, Ada_Indent_Broken)))));
end case;
end formal_object_declaration_1;
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)
is
Parse_Data : Wisi.Parse_Data_Type renames Wisi.Parse_Data_Type (User_Data);
T1 : constant SAL.Peek_Type := 1;
T2 : constant SAL.Peek_Type := 2;
T3 : constant SAL.Peek_Type := 3;
T4 : constant SAL.Peek_Type := 4;
T5 : constant SAL.Peek_Type := 5;
T7 : constant SAL.Peek_Type := 6;
T8 : constant SAL.Peek_Type := 7;
begin
case Parse_Data.Post_Parse_Action is
when Navigate =>
Statement_Action (Parse_Data, Tree, Nonterm, ((T1, Statement_Start), (T8, Statement_End)));
when Face =>
Face_Apply_Action (Parse_Data, Tree, Nonterm, (1 => (T5, 1, 2)));
when Indent =>
Indent_Action_0 (Parse_Data, Tree, Nonterm, (T1 => (False, (Simple, (Label => None))), T2 => (False, (Simple,
(Int, Ada_Indent_Broken))), T3 => (False, (Simple, (Int, Ada_Indent_Broken))), T4 => (False, (Simple, (Int,
Ada_Indent_Broken))), T5 => (False, (Hanging_2, (Int, Ada_Indent_Broken), (Int, Ada_Indent_Broken))), T7 =>
(False, (Simple, (Int, Ada_Indent_Broken))), T8 => (False, (Simple, (Int, Ada_Indent_Broken)))));
end case;
end formal_object_declaration_2;
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)
is
Parse_Data : Wisi.Parse_Data_Type renames Wisi.Parse_Data_Type (User_Data);
T1 : constant SAL.Peek_Type := 1;
T2 : constant SAL.Peek_Type := 2;
T3 : constant SAL.Peek_Type := 3;
T4 : constant SAL.Peek_Type := 4;
T5 : constant SAL.Peek_Type := 5;
T8 : constant SAL.Peek_Type := 6;
begin
case Parse_Data.Post_Parse_Action is
when Navigate =>
Statement_Action (Parse_Data, Tree, Nonterm, ((T1, Statement_Start), (T8, Statement_End)));
when Face =>
Face_Apply_Action (Parse_Data, Tree, Nonterm, (1 => (T5, 1, 2)));
when Indent =>
Indent_Action_0 (Parse_Data, Tree, Nonterm, (T1 => (False, (Simple, (Label => None))), T2 => (False, (Simple,
(Int, Ada_Indent_Broken))), T3 => (False, (Simple, (Int, Ada_Indent_Broken))), T4 => (False, (Simple, (Int,
Ada_Indent_Broken))), T5 => (False, (Hanging_2, (Int, Ada_Indent_Broken), (Int, Ada_Indent_Broken))), T8 =>
(False, (Simple, (Int, Ada_Indent_Broken)))));
end case;
end formal_object_declaration_3;
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)
is
Parse_Data : Wisi.Parse_Data_Type renames Wisi.Parse_Data_Type (User_Data);
T1 : constant SAL.Peek_Type := 1;
T2 : constant SAL.Peek_Type := 2;
T3 : constant SAL.Peek_Type := 3;
T5 : constant SAL.Peek_Type := 4;
T6 : constant SAL.Peek_Type := 5;
T7 : constant SAL.Peek_Type := 6;
T8 : constant SAL.Peek_Type := 7;
begin
case Parse_Data.Post_Parse_Action is
when Navigate =>
Statement_Action (Parse_Data, Tree, Nonterm, ((T1, Statement_Start), (T8, Statement_End)));
when Face =>
Face_Apply_Action (Parse_Data, Tree, Nonterm, (1 => (T5, 1, 2)));
when Indent =>
Indent_Action_0 (Parse_Data, Tree, Nonterm, (T1 => (False, (Simple, (Label => None))), T2 => (False, (Simple,
(Int, Ada_Indent_Broken))), T3 => (False, (Simple, (Int, Ada_Indent_Broken))), T5 => (False, (Hanging_2, (Int,
Ada_Indent_Broken), (Int, Ada_Indent_Broken))), T6 => (False, (Hanging_1, (Anchored_1, T5, Ada_Indent_Broken),
(Anchored_1, T5, 2 * Ada_Indent_Broken))), T7 => (False, (Simple, (Int, Ada_Indent_Broken))), T8 => (False,
(Simple, (Int, Ada_Indent_Broken)))));
end case;
end formal_object_declaration_4;
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)
is
Parse_Data : Wisi.Parse_Data_Type renames Wisi.Parse_Data_Type (User_Data);
T1 : constant SAL.Peek_Type := 1;
T2 : constant SAL.Peek_Type := 2;
T3 : constant SAL.Peek_Type := 3;
T5 : constant SAL.Peek_Type := 4;
T6 : constant SAL.Peek_Type := 5;
T8 : constant SAL.Peek_Type := 6;
begin
case Parse_Data.Post_Parse_Action is
when Navigate =>
Statement_Action (Parse_Data, Tree, Nonterm, ((T1, Statement_Start), (T8, Statement_End)));
when Face =>
Face_Apply_Action (Parse_Data, Tree, Nonterm, (1 => (T5, 1, 2)));
when Indent =>
Indent_Action_0 (Parse_Data, Tree, Nonterm, (T1 => (False, (Simple, (Label => None))), T2 => (False, (Simple,
(Int, Ada_Indent_Broken))), T3 => (False, (Simple, (Int, Ada_Indent_Broken))), T5 => (False, (Hanging_2, (Int,
Ada_Indent_Broken), (Int, Ada_Indent_Broken))), T6 => (False, (Hanging_1, (Anchored_1, T5, Ada_Indent_Broken),
(Anchored_1, T5, 2 * Ada_Indent_Broken))), T8 => (False, (Simple, (Int, Ada_Indent_Broken)))));
end case;
end formal_object_declaration_5;
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)
is
Parse_Data : Wisi.Parse_Data_Type renames Wisi.Parse_Data_Type (User_Data);
T1 : constant SAL.Peek_Type := 1;
T2 : constant SAL.Peek_Type := 2;
T3 : constant SAL.Peek_Type := 3;
T5 : constant SAL.Peek_Type := 4;
T7 : constant SAL.Peek_Type := 5;
T8 : constant SAL.Peek_Type := 6;
begin
case Parse_Data.Post_Parse_Action is
when Navigate =>
Statement_Action (Parse_Data, Tree, Nonterm, ((T1, Statement_Start), (T8, Statement_End)));
when Face =>
Face_Apply_Action (Parse_Data, Tree, Nonterm, (1 => (T5, 1, 2)));
when Indent =>
Indent_Action_0 (Parse_Data, Tree, Nonterm, (T1 => (False, (Simple, (Label => None))), T2 => (False, (Simple,
(Int, Ada_Indent_Broken))), T3 => (False, (Simple, (Int, Ada_Indent_Broken))), T5 => (False, (Hanging_2, (Int,
Ada_Indent_Broken), (Int, Ada_Indent_Broken))), T7 => (False, (Simple, (Int, Ada_Indent_Broken))), T8 =>
(False, (Simple, (Int, Ada_Indent_Broken)))));
end case;
end formal_object_declaration_6;
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)
is
Parse_Data : Wisi.Parse_Data_Type renames Wisi.Parse_Data_Type (User_Data);
T1 : constant SAL.Peek_Type := 1;
T2 : constant SAL.Peek_Type := 2;
T3 : constant SAL.Peek_Type := 3;
T5 : constant SAL.Peek_Type := 4;
T8 : constant SAL.Peek_Type := 5;
begin
case Parse_Data.Post_Parse_Action is
when Navigate =>
Statement_Action (Parse_Data, Tree, Nonterm, ((T1, Statement_Start), (T8, Statement_End)));
when Face =>
Face_Apply_Action (Parse_Data, Tree, Nonterm, (1 => (T5, 1, 2)));
when Indent =>
Indent_Action_0 (Parse_Data, Tree, Nonterm, (T1 => (False, (Simple, (Label => None))), T2 => (False, (Simple,
(Int, Ada_Indent_Broken))), T3 => (False, (Simple, (Int, Ada_Indent_Broken))), T5 => (False, (Hanging_2, (Int,
Ada_Indent_Broken), (Int, Ada_Indent_Broken))), T8 => (False, (Simple, (Int, Ada_Indent_Broken)))));
end case;
end formal_object_declaration_7;
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)
is
Parse_Data : Wisi.Parse_Data_Type renames Wisi.Parse_Data_Type (User_Data);
T1 : constant SAL.Peek_Type := 1;
T2 : constant SAL.Peek_Type := 2;
T3 : constant SAL.Peek_Type := 3;
T4 : constant SAL.Peek_Type := 4;
T5 : constant SAL.Peek_Type := 5;
T6 : constant SAL.Peek_Type := 6;
T7 : constant SAL.Peek_Type := 7;
begin
case Parse_Data.Post_Parse_Action is
when Navigate =>
Statement_Action (Parse_Data, Tree, Nonterm, ((T1, Statement_Start), (T7, Statement_End)));
when Face =>
null;
when Indent =>
Indent_Action_0 (Parse_Data, Tree, Nonterm, (T1 => (False, (Simple, (Label => None))), T2 => (False, (Simple,
(Int, Ada_Indent_Broken))), T3 => (False, (Simple, (Int, Ada_Indent_Broken))), T4 => (False, (Simple, (Int,
Ada_Indent_Broken))), T5 => (False, (Hanging_1, (Anchored_1, T4, Ada_Indent_Broken), (Anchored_1, T4, 2 *
Ada_Indent_Broken))), T6 => (False, (Simple, (Int, Ada_Indent_Broken))), T7 => (False, (Simple, (Int,
Ada_Indent_Broken)))));
end case;
end formal_object_declaration_8;
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)
is
Parse_Data : Wisi.Parse_Data_Type renames Wisi.Parse_Data_Type (User_Data);
T1 : constant SAL.Peek_Type := 1;
T2 : constant SAL.Peek_Type := 2;
T3 : constant SAL.Peek_Type := 3;
T4 : constant SAL.Peek_Type := 4;
T5 : constant SAL.Peek_Type := 5;
T7 : constant SAL.Peek_Type := 6;
begin
case Parse_Data.Post_Parse_Action is
when Navigate =>
Statement_Action (Parse_Data, Tree, Nonterm, ((T1, Statement_Start), (T7, Statement_End)));
when Face =>
null;
when Indent =>
Indent_Action_0 (Parse_Data, Tree, Nonterm, (T1 => (False, (Simple, (Label => None))), T2 => (False, (Simple,
(Int, Ada_Indent_Broken))), T3 => (False, (Simple, (Int, Ada_Indent_Broken))), T4 => (False, (Simple, (Int,
Ada_Indent_Broken))), T5 => (False, (Hanging_1, (Anchored_1, T4, Ada_Indent_Broken), (Anchored_1, T4, 2 *
Ada_Indent_Broken))), T7 => (False, (Simple, (Int, Ada_Indent_Broken)))));
end case;
end formal_object_declaration_9;
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)
is
Parse_Data : Wisi.Parse_Data_Type renames Wisi.Parse_Data_Type (User_Data);
T1 : constant SAL.Peek_Type := 1;
T2 : constant SAL.Peek_Type := 2;
T3 : constant SAL.Peek_Type := 3;
T4 : constant SAL.Peek_Type := 4;
T6 : constant SAL.Peek_Type := 5;
T7 : constant SAL.Peek_Type := 6;
begin
case Parse_Data.Post_Parse_Action is
when Navigate =>
Statement_Action (Parse_Data, Tree, Nonterm, ((T1, Statement_Start), (T7, Statement_End)));
when Face =>
null;
when Indent =>
Indent_Action_0 (Parse_Data, Tree, Nonterm, (T1 => (False, (Simple, (Label => None))), T2 => (False, (Simple,
(Int, Ada_Indent_Broken))), T3 => (False, (Simple, (Int, Ada_Indent_Broken))), T4 => (False, (Simple, (Int,
Ada_Indent_Broken))), T6 => (False, (Simple, (Int, Ada_Indent_Broken))), T7 => (False, (Simple, (Int,
Ada_Indent_Broken)))));
end case;
end formal_object_declaration_10;
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)
is
Parse_Data : Wisi.Parse_Data_Type renames Wisi.Parse_Data_Type (User_Data);
T1 : constant SAL.Peek_Type := 1;
T2 : constant SAL.Peek_Type := 2;
T3 : constant SAL.Peek_Type := 3;
T4 : constant SAL.Peek_Type := 4;
T7 : constant SAL.Peek_Type := 5;
begin
case Parse_Data.Post_Parse_Action is
when Navigate =>
Statement_Action (Parse_Data, Tree, Nonterm, ((T1, Statement_Start), (T7, Statement_End)));
when Face =>
null;
when Indent =>
Indent_Action_0 (Parse_Data, Tree, Nonterm, (T1 => (False, (Simple, (Label => None))), T2 => (False, (Simple,
(Int, Ada_Indent_Broken))), T3 => (False, (Simple, (Int, Ada_Indent_Broken))), T4 => (False, (Simple, (Int,
Ada_Indent_Broken))), T7 => (False, (Simple, (Int, Ada_Indent_Broken)))));
end case;
end formal_object_declaration_11;
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)
is
Parse_Data : Wisi.Parse_Data_Type renames Wisi.Parse_Data_Type (User_Data);
T1 : constant SAL.Peek_Type := 1;
T2 : constant SAL.Peek_Type := 2;
T3 : constant SAL.Peek_Type := 3;
T4 : constant SAL.Peek_Type := 4;
T5 : constant SAL.Peek_Type := 5;
T6 : constant SAL.Peek_Type := 6;
T7 : constant SAL.Peek_Type := 7;
T8 : constant SAL.Peek_Type := 8;
T9 : constant SAL.Peek_Type := 9;
T10 : constant SAL.Peek_Type := 10;
begin
case Parse_Data.Post_Parse_Action is
when Navigate =>
Statement_Action (Parse_Data, Tree, Nonterm, ((T1, Statement_Start), (T10, Statement_End)));
when Face =>
Face_Apply_Action (Parse_Data, Tree, Nonterm, ((T2, 3, 2), (T8, 3, 2)));
when Indent =>
Indent_Action_0 (Parse_Data, Tree, Nonterm, (T1 => (False, (Simple, (Label => None))), T2 => (False, (Simple,
(Int, Ada_Indent_Broken))), T3 => (False, (Simple, (Int, Ada_Indent_Broken))), T4 => (False, (Simple, (Int,
Ada_Indent_Broken))), T5 => (False, (Simple, (Int, Ada_Indent_Broken))), T6 => (False, (Simple, (Int,
Ada_Indent_Broken))), T7 => (False, (Simple, (Int, Ada_Indent_Broken))), T8 => (False, (Simple, (Int,
Ada_Indent_Broken))), T9 => (False, (Simple, (Int, Ada_Indent_Broken))), T10 => (False, (Simple, (Int,
Ada_Indent_Broken)))));
end case;
end formal_complete_type_declaration_0;
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)
is
Parse_Data : Wisi.Parse_Data_Type renames Wisi.Parse_Data_Type (User_Data);
T1 : constant SAL.Peek_Type := 1;
T2 : constant SAL.Peek_Type := 2;
T3 : constant SAL.Peek_Type := 3;
T4 : constant SAL.Peek_Type := 4;
T5 : constant SAL.Peek_Type := 5;
T6 : constant SAL.Peek_Type := 6;
T7 : constant SAL.Peek_Type := 7;
T8 : constant SAL.Peek_Type := 8;
T10 : constant SAL.Peek_Type := 9;
begin
case Parse_Data.Post_Parse_Action is
when Navigate =>
Statement_Action (Parse_Data, Tree, Nonterm, ((T1, Statement_Start), (T10, Statement_End)));
when Face =>
Face_Apply_Action (Parse_Data, Tree, Nonterm, ((T2, 3, 2), (T8, 3, 2)));
when Indent =>
Indent_Action_0 (Parse_Data, Tree, Nonterm, (T1 => (False, (Simple, (Label => None))), T2 => (False, (Simple,
(Int, Ada_Indent_Broken))), T3 => (False, (Simple, (Int, Ada_Indent_Broken))), T4 => (False, (Simple, (Int,
Ada_Indent_Broken))), T5 => (False, (Simple, (Int, Ada_Indent_Broken))), T6 => (False, (Simple, (Int,
Ada_Indent_Broken))), T7 => (False, (Simple, (Int, Ada_Indent_Broken))), T8 => (False, (Simple, (Int,
Ada_Indent_Broken))), T10 => (False, (Simple, (Int, Ada_Indent_Broken)))));
end case;
end formal_complete_type_declaration_1;
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)
is
Parse_Data : Wisi.Parse_Data_Type renames Wisi.Parse_Data_Type (User_Data);
T1 : constant SAL.Peek_Type := 1;
T2 : constant SAL.Peek_Type := 2;
T3 : constant SAL.Peek_Type := 3;
T4 : constant SAL.Peek_Type := 4;
T5 : constant SAL.Peek_Type := 5;
T9 : constant SAL.Peek_Type := 6;
T10 : constant SAL.Peek_Type := 7;
begin
case Parse_Data.Post_Parse_Action is
when Navigate =>
Statement_Action (Parse_Data, Tree, Nonterm, ((T1, Statement_Start), (T10, Statement_End)));
when Face =>
Face_Apply_Action (Parse_Data, Tree, Nonterm, (1 => (T2, 3, 2)));
when Indent =>
Indent_Action_0 (Parse_Data, Tree, Nonterm, (T1 => (False, (Simple, (Label => None))), T2 => (False, (Simple,
(Int, Ada_Indent_Broken))), T3 => (False, (Simple, (Int, Ada_Indent_Broken))), T4 => (False, (Simple, (Int,
Ada_Indent_Broken))), T5 => (False, (Simple, (Int, Ada_Indent_Broken))), T9 => (False, (Simple, (Int,
Ada_Indent_Broken))), T10 => (False, (Simple, (Int, Ada_Indent_Broken)))));
end case;
end formal_complete_type_declaration_2;
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)
is
Parse_Data : Wisi.Parse_Data_Type renames Wisi.Parse_Data_Type (User_Data);
T1 : constant SAL.Peek_Type := 1;
T2 : constant SAL.Peek_Type := 2;
T3 : constant SAL.Peek_Type := 3;
T4 : constant SAL.Peek_Type := 4;
T5 : constant SAL.Peek_Type := 5;
T10 : constant SAL.Peek_Type := 6;
begin
case Parse_Data.Post_Parse_Action is
when Navigate =>
Statement_Action (Parse_Data, Tree, Nonterm, ((T1, Statement_Start), (T10, Statement_End)));
when Face =>
Face_Apply_Action (Parse_Data, Tree, Nonterm, (1 => (T2, 3, 2)));
when Indent =>
Indent_Action_0 (Parse_Data, Tree, Nonterm, (T1 => (False, (Simple, (Label => None))), T2 => (False, (Simple,
(Int, Ada_Indent_Broken))), T3 => (False, (Simple, (Int, Ada_Indent_Broken))), T4 => (False, (Simple, (Int,
Ada_Indent_Broken))), T5 => (False, (Simple, (Int, Ada_Indent_Broken))), T10 => (False, (Simple, (Int,
Ada_Indent_Broken)))));
end case;
end formal_complete_type_declaration_3;
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)
is
Parse_Data : Wisi.Parse_Data_Type renames Wisi.Parse_Data_Type (User_Data);
T1 : constant SAL.Peek_Type := 1;
T2 : constant SAL.Peek_Type := 2;
T4 : constant SAL.Peek_Type := 3;
T5 : constant SAL.Peek_Type := 4;
T6 : constant SAL.Peek_Type := 5;
T7 : constant SAL.Peek_Type := 6;
T8 : constant SAL.Peek_Type := 7;
T9 : constant SAL.Peek_Type := 8;
T10 : constant SAL.Peek_Type := 9;
begin
case Parse_Data.Post_Parse_Action is
when Navigate =>
Statement_Action (Parse_Data, Tree, Nonterm, ((T1, Statement_Start), (T10, Statement_End)));
when Face =>
Face_Apply_Action (Parse_Data, Tree, Nonterm, ((T2, 3, 2), (T8, 3, 2)));
when Indent =>
Indent_Action_0 (Parse_Data, Tree, Nonterm, (T1 => (False, (Simple, (Label => None))), T2 => (False, (Simple,
(Int, Ada_Indent_Broken))), T4 => (False, (Simple, (Int, Ada_Indent_Broken))), T5 => (False, (Simple, (Int,
Ada_Indent_Broken))), T6 => (False, (Simple, (Int, Ada_Indent_Broken))), T7 => (False, (Simple, (Int,
Ada_Indent_Broken))), T8 => (False, (Simple, (Int, Ada_Indent_Broken))), T9 => (False, (Simple, (Int,
Ada_Indent_Broken))), T10 => (False, (Simple, (Int, Ada_Indent_Broken)))));
end case;
end formal_complete_type_declaration_4;
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)
is
Parse_Data : Wisi.Parse_Data_Type renames Wisi.Parse_Data_Type (User_Data);
T1 : constant SAL.Peek_Type := 1;
T2 : constant SAL.Peek_Type := 2;
T4 : constant SAL.Peek_Type := 3;
T5 : constant SAL.Peek_Type := 4;
T6 : constant SAL.Peek_Type := 5;
T7 : constant SAL.Peek_Type := 6;
T8 : constant SAL.Peek_Type := 7;
T10 : constant SAL.Peek_Type := 8;
begin
case Parse_Data.Post_Parse_Action is
when Navigate =>
Statement_Action (Parse_Data, Tree, Nonterm, ((T1, Statement_Start), (T10, Statement_End)));
when Face =>
Face_Apply_Action (Parse_Data, Tree, Nonterm, ((T2, 3, 2), (T8, 3, 2)));
when Indent =>
Indent_Action_0 (Parse_Data, Tree, Nonterm, (T1 => (False, (Simple, (Label => None))), T2 => (False, (Simple,
(Int, Ada_Indent_Broken))), T4 => (False, (Simple, (Int, Ada_Indent_Broken))), T5 => (False, (Simple, (Int,
Ada_Indent_Broken))), T6 => (False, (Simple, (Int, Ada_Indent_Broken))), T7 => (False, (Simple, (Int,
Ada_Indent_Broken))), T8 => (False, (Simple, (Int, Ada_Indent_Broken))), T10 => (False, (Simple, (Int,
Ada_Indent_Broken)))));
end case;
end formal_complete_type_declaration_5;
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)
is
Parse_Data : Wisi.Parse_Data_Type renames Wisi.Parse_Data_Type (User_Data);
T1 : constant SAL.Peek_Type := 1;
T2 : constant SAL.Peek_Type := 2;
T4 : constant SAL.Peek_Type := 3;
T5 : constant SAL.Peek_Type := 4;
T9 : constant SAL.Peek_Type := 5;
T10 : constant SAL.Peek_Type := 6;
begin
case Parse_Data.Post_Parse_Action is
when Navigate =>
Statement_Action (Parse_Data, Tree, Nonterm, ((T1, Statement_Start), (T10, Statement_End)));
when Face =>
Face_Apply_Action (Parse_Data, Tree, Nonterm, (1 => (T2, 3, 2)));
when Indent =>
Indent_Action_0 (Parse_Data, Tree, Nonterm, (T1 => (False, (Simple, (Label => None))), T2 => (False, (Simple,
(Int, Ada_Indent_Broken))), T4 => (False, (Simple, (Int, Ada_Indent_Broken))), T5 => (False, (Simple, (Int,
Ada_Indent_Broken))), T9 => (False, (Simple, (Int, Ada_Indent_Broken))), T10 => (False, (Simple, (Int,
Ada_Indent_Broken)))));
end case;
end formal_complete_type_declaration_6;
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)
is
Parse_Data : Wisi.Parse_Data_Type renames Wisi.Parse_Data_Type (User_Data);
T1 : constant SAL.Peek_Type := 1;
T2 : constant SAL.Peek_Type := 2;
T4 : constant SAL.Peek_Type := 3;
T5 : constant SAL.Peek_Type := 4;
T10 : constant SAL.Peek_Type := 5;
begin
case Parse_Data.Post_Parse_Action is
when Navigate =>
Statement_Action (Parse_Data, Tree, Nonterm, ((T1, Statement_Start), (T10, Statement_End)));
when Face =>
Face_Apply_Action (Parse_Data, Tree, Nonterm, (1 => (T2, 3, 2)));
when Indent =>
Indent_Action_0 (Parse_Data, Tree, Nonterm, (T1 => (False, (Simple, (Label => None))), T2 => (False, (Simple,
(Int, Ada_Indent_Broken))), T4 => (False, (Simple, (Int, Ada_Indent_Broken))), T5 => (False, (Simple, (Int,
Ada_Indent_Broken))), T10 => (False, (Simple, (Int, Ada_Indent_Broken)))));
end case;
end formal_complete_type_declaration_7;
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)
is
Parse_Data : Wisi.Parse_Data_Type renames Wisi.Parse_Data_Type (User_Data);
T1 : constant SAL.Peek_Type := 1;
T2 : constant SAL.Peek_Type := 2;
T3 : constant SAL.Peek_Type := 3;
T4 : constant SAL.Peek_Type := 4;
T5 : constant SAL.Peek_Type := 5;
T6 : constant SAL.Peek_Type := 6;
T7 : constant SAL.Peek_Type := 7;
T8 : constant SAL.Peek_Type := 8;
T9 : constant SAL.Peek_Type := 9;
begin
case Parse_Data.Post_Parse_Action is
when Navigate =>
Statement_Action (Parse_Data, Tree, Nonterm, ((T1, Statement_Start), (T9, Statement_End)));
when Face =>
Face_Apply_Action (Parse_Data, Tree, Nonterm, ((T2, 3, 2), (T8, 3, 2)));
when Indent =>
Indent_Action_0 (Parse_Data, Tree, Nonterm, (T1 => (False, (Simple, (Label => None))), T2 => (False, (Simple,
(Int, Ada_Indent_Broken))), T3 => (False, (Simple, (Int, Ada_Indent_Broken))), T4 => (False, (Simple, (Int,
Ada_Indent_Broken))), T5 => (False, (Simple, (Int, Ada_Indent_Broken))), T6 => (False, (Simple, (Int,
Ada_Indent_Broken))), T7 => (False, (Simple, (Int, Ada_Indent_Broken))), T8 => (False, (Simple, (Int,
Ada_Indent_Broken))), T9 => (False, (Simple, (Int, Ada_Indent_Broken)))));
end case;
end formal_incomplete_type_declaration_0;
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)
is
Parse_Data : Wisi.Parse_Data_Type renames Wisi.Parse_Data_Type (User_Data);
T1 : constant SAL.Peek_Type := 1;
T2 : constant SAL.Peek_Type := 2;
T3 : constant SAL.Peek_Type := 3;
T4 : constant SAL.Peek_Type := 4;
T5 : constant SAL.Peek_Type := 5;
T9 : constant SAL.Peek_Type := 6;
begin
case Parse_Data.Post_Parse_Action is
when Navigate =>
Statement_Action (Parse_Data, Tree, Nonterm, ((T1, Statement_Start), (T9, Statement_End)));
when Face =>
Face_Apply_Action (Parse_Data, Tree, Nonterm, (1 => (T2, 3, 2)));
when Indent =>
Indent_Action_0 (Parse_Data, Tree, Nonterm, (T1 => (False, (Simple, (Label => None))), T2 => (False, (Simple,
(Int, Ada_Indent_Broken))), T3 => (False, (Simple, (Int, Ada_Indent_Broken))), T4 => (False, (Simple, (Int,
Ada_Indent_Broken))), T5 => (False, (Simple, (Int, Ada_Indent_Broken))), T9 => (False, (Simple, (Int,
Ada_Indent_Broken)))));
end case;
end formal_incomplete_type_declaration_1;
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)
is
Parse_Data : Wisi.Parse_Data_Type renames Wisi.Parse_Data_Type (User_Data);
T1 : constant SAL.Peek_Type := 1;
T2 : constant SAL.Peek_Type := 2;
T3 : constant SAL.Peek_Type := 3;
T6 : constant SAL.Peek_Type := 4;
T7 : constant SAL.Peek_Type := 5;
T8 : constant SAL.Peek_Type := 6;
T9 : constant SAL.Peek_Type := 7;
begin
case Parse_Data.Post_Parse_Action is
when Navigate =>
Statement_Action (Parse_Data, Tree, Nonterm, ((T1, Statement_Start), (T9, Statement_End)));
when Face =>
Face_Apply_Action (Parse_Data, Tree, Nonterm, ((T2, 3, 2), (T8, 3, 2)));
when Indent =>
Indent_Action_0 (Parse_Data, Tree, Nonterm, (T1 => (False, (Simple, (Label => None))), T2 => (False, (Simple,
(Int, Ada_Indent_Broken))), T3 => (False, (Simple, (Int, Ada_Indent_Broken))), T6 => (False, (Simple, (Int,
Ada_Indent_Broken))), T7 => (False, (Simple, (Int, Ada_Indent_Broken))), T8 => (False, (Simple, (Int,
Ada_Indent_Broken))), T9 => (False, (Simple, (Int, Ada_Indent_Broken)))));
end case;
end formal_incomplete_type_declaration_2;
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)
is
Parse_Data : Wisi.Parse_Data_Type renames Wisi.Parse_Data_Type (User_Data);
T1 : constant SAL.Peek_Type := 1;
T2 : constant SAL.Peek_Type := 2;
T3 : constant SAL.Peek_Type := 3;
T9 : constant SAL.Peek_Type := 4;
begin
case Parse_Data.Post_Parse_Action is
when Navigate =>
Statement_Action (Parse_Data, Tree, Nonterm, ((T1, Statement_Start), (T9, Statement_End)));
when Face =>
Face_Apply_Action (Parse_Data, Tree, Nonterm, (1 => (T2, 3, 2)));
when Indent =>
Indent_Action_0 (Parse_Data, Tree, Nonterm, (T1 => (False, (Simple, (Label => None))), T2 => (False, (Simple,
(Int, Ada_Indent_Broken))), T3 => (False, (Simple, (Int, Ada_Indent_Broken))), T9 => (False, (Simple, (Int,
Ada_Indent_Broken)))));
end case;
end formal_incomplete_type_declaration_3;
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)
is
Parse_Data : Wisi.Parse_Data_Type renames Wisi.Parse_Data_Type (User_Data);
T1 : constant SAL.Peek_Type := 1;
T2 : constant SAL.Peek_Type := 2;
T4 : constant SAL.Peek_Type := 3;
T5 : constant SAL.Peek_Type := 4;
T6 : constant SAL.Peek_Type := 5;
T7 : constant SAL.Peek_Type := 6;
T8 : constant SAL.Peek_Type := 7;
T9 : constant SAL.Peek_Type := 8;
begin
case Parse_Data.Post_Parse_Action is
when Navigate =>
Statement_Action (Parse_Data, Tree, Nonterm, ((T1, Statement_Start), (T9, Statement_End)));
when Face =>
Face_Apply_Action (Parse_Data, Tree, Nonterm, ((T2, 3, 2), (T8, 3, 2)));
when Indent =>
Indent_Action_0 (Parse_Data, Tree, Nonterm, (T1 => (False, (Simple, (Label => None))), T2 => (False, (Simple,
(Int, Ada_Indent_Broken))), T4 => (False, (Simple, (Int, Ada_Indent_Broken))), T5 => (False, (Simple, (Int,
Ada_Indent_Broken))), T6 => (False, (Simple, (Int, Ada_Indent_Broken))), T7 => (False, (Simple, (Int,
Ada_Indent_Broken))), T8 => (False, (Simple, (Int, Ada_Indent_Broken))), T9 => (False, (Simple, (Int,
Ada_Indent_Broken)))));
end case;
end formal_incomplete_type_declaration_4;
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)
is
Parse_Data : Wisi.Parse_Data_Type renames Wisi.Parse_Data_Type (User_Data);
T1 : constant SAL.Peek_Type := 1;
T2 : constant SAL.Peek_Type := 2;
T4 : constant SAL.Peek_Type := 3;
T5 : constant SAL.Peek_Type := 4;
T9 : constant SAL.Peek_Type := 5;
begin
case Parse_Data.Post_Parse_Action is
when Navigate =>
Statement_Action (Parse_Data, Tree, Nonterm, ((T1, Statement_Start), (T9, Statement_End)));
when Face =>
Face_Apply_Action (Parse_Data, Tree, Nonterm, (1 => (T2, 3, 2)));
when Indent =>
Indent_Action_0 (Parse_Data, Tree, Nonterm, (T1 => (False, (Simple, (Label => None))), T2 => (False, (Simple,
(Int, Ada_Indent_Broken))), T4 => (False, (Simple, (Int, Ada_Indent_Broken))), T5 => (False, (Simple, (Int,
Ada_Indent_Broken))), T9 => (False, (Simple, (Int, Ada_Indent_Broken)))));
end case;
end formal_incomplete_type_declaration_5;
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)
is
Parse_Data : Wisi.Parse_Data_Type renames Wisi.Parse_Data_Type (User_Data);
T1 : constant SAL.Peek_Type := 1;
T2 : constant SAL.Peek_Type := 2;
T6 : constant SAL.Peek_Type := 3;
T7 : constant SAL.Peek_Type := 4;
T8 : constant SAL.Peek_Type := 5;
T9 : constant SAL.Peek_Type := 6;
begin
case Parse_Data.Post_Parse_Action is
when Navigate =>
Statement_Action (Parse_Data, Tree, Nonterm, ((T1, Statement_Start), (T9, Statement_End)));
when Face =>
Face_Apply_Action (Parse_Data, Tree, Nonterm, ((T2, 3, 2), (T8, 3, 2)));
when Indent =>
Indent_Action_0 (Parse_Data, Tree, Nonterm, (T1 => (False, (Simple, (Label => None))), T2 => (False, (Simple,
(Int, Ada_Indent_Broken))), T6 => (False, (Simple, (Int, Ada_Indent_Broken))), T7 => (False, (Simple, (Int,
Ada_Indent_Broken))), T8 => (False, (Simple, (Int, Ada_Indent_Broken))), T9 => (False, (Simple, (Int,
Ada_Indent_Broken)))));
end case;
end formal_incomplete_type_declaration_6;
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)
is
Parse_Data : Wisi.Parse_Data_Type renames Wisi.Parse_Data_Type (User_Data);
T1 : constant SAL.Peek_Type := 1;
T2 : constant SAL.Peek_Type := 2;
T9 : constant SAL.Peek_Type := 3;
begin
case Parse_Data.Post_Parse_Action is
when Navigate =>
Statement_Action (Parse_Data, Tree, Nonterm, ((T1, Statement_Start), (T9, Statement_End)));
when Face =>
Face_Apply_Action (Parse_Data, Tree, Nonterm, (1 => (T2, 3, 2)));
when Indent =>
Indent_Action_0 (Parse_Data, Tree, Nonterm, (T1 => (False, (Simple, (Label => None))), T2 => (False, (Simple,
(Int, Ada_Indent_Broken))), T9 => (False, (Simple, (Int, Ada_Indent_Broken)))));
end case;
end formal_incomplete_type_declaration_7;
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)
is
Parse_Data : Wisi.Parse_Data_Type renames Wisi.Parse_Data_Type (User_Data);
T5 : constant SAL.Peek_Type := 4;
begin
case Parse_Data.Post_Parse_Action is
when Navigate =>
null;
when Face =>
Face_Apply_Action (Parse_Data, Tree, Nonterm, (1 => (T5, 1, 2)));
when Indent =>
null;
end case;
end formal_derived_type_definition_0;
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)
is
Parse_Data : Wisi.Parse_Data_Type renames Wisi.Parse_Data_Type (User_Data);
T5 : constant SAL.Peek_Type := 4;
begin
case Parse_Data.Post_Parse_Action is
when Navigate =>
null;
when Face =>
Face_Apply_Action (Parse_Data, Tree, Nonterm, (1 => (T5, 1, 2)));
when Indent =>
null;
end case;
end formal_derived_type_definition_1;
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)
is
Parse_Data : Wisi.Parse_Data_Type renames Wisi.Parse_Data_Type (User_Data);
T5 : constant SAL.Peek_Type := 4;
begin
case Parse_Data.Post_Parse_Action is
when Navigate =>
null;
when Face =>
Face_Apply_Action (Parse_Data, Tree, Nonterm, (1 => (T5, 1, 2)));
when Indent =>
null;
end case;
end formal_derived_type_definition_2;
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)
is
Parse_Data : Wisi.Parse_Data_Type renames Wisi.Parse_Data_Type (User_Data);
T5 : constant SAL.Peek_Type := 4;
begin
case Parse_Data.Post_Parse_Action is
when Navigate =>
null;
when Face =>
Face_Apply_Action (Parse_Data, Tree, Nonterm, (1 => (T5, 1, 2)));
when Indent =>
null;
end case;
end formal_derived_type_definition_3;
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)
is
Parse_Data : Wisi.Parse_Data_Type renames Wisi.Parse_Data_Type (User_Data);
T5 : constant SAL.Peek_Type := 4;
begin
case Parse_Data.Post_Parse_Action is
when Navigate =>
null;
when Face =>
Face_Apply_Action (Parse_Data, Tree, Nonterm, (1 => (T5, 1, 2)));
when Indent =>
null;
end case;
end formal_derived_type_definition_4;
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)
is
Parse_Data : Wisi.Parse_Data_Type renames Wisi.Parse_Data_Type (User_Data);
T5 : constant SAL.Peek_Type := 4;
begin
case Parse_Data.Post_Parse_Action is
when Navigate =>
null;
when Face =>
Face_Apply_Action (Parse_Data, Tree, Nonterm, (1 => (T5, 1, 2)));
when Indent =>
null;
end case;
end formal_derived_type_definition_5;
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)
is
Parse_Data : Wisi.Parse_Data_Type renames Wisi.Parse_Data_Type (User_Data);
T5 : constant SAL.Peek_Type := 3;
begin
case Parse_Data.Post_Parse_Action is
when Navigate =>
null;
when Face =>
Face_Apply_Action (Parse_Data, Tree, Nonterm, (1 => (T5, 1, 2)));
when Indent =>
null;
end case;
end formal_derived_type_definition_6;
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)
is
Parse_Data : Wisi.Parse_Data_Type renames Wisi.Parse_Data_Type (User_Data);
T5 : constant SAL.Peek_Type := 3;
begin
case Parse_Data.Post_Parse_Action is
when Navigate =>
null;
when Face =>
Face_Apply_Action (Parse_Data, Tree, Nonterm, (1 => (T5, 1, 2)));
when Indent =>
null;
end case;
end formal_derived_type_definition_7;
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)
is
Parse_Data : Wisi.Parse_Data_Type renames Wisi.Parse_Data_Type (User_Data);
T5 : constant SAL.Peek_Type := 3;
begin
case Parse_Data.Post_Parse_Action is
when Navigate =>
null;
when Face =>
Face_Apply_Action (Parse_Data, Tree, Nonterm, (1 => (T5, 1, 2)));
when Indent =>
null;
end case;
end formal_derived_type_definition_8;
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)
is
Parse_Data : Wisi.Parse_Data_Type renames Wisi.Parse_Data_Type (User_Data);
T5 : constant SAL.Peek_Type := 3;
begin
case Parse_Data.Post_Parse_Action is
when Navigate =>
null;
when Face =>
Face_Apply_Action (Parse_Data, Tree, Nonterm, (1 => (T5, 1, 2)));
when Indent =>
null;
end case;
end formal_derived_type_definition_9;
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)
is
Parse_Data : Wisi.Parse_Data_Type renames Wisi.Parse_Data_Type (User_Data);
T5 : constant SAL.Peek_Type := 3;
begin
case Parse_Data.Post_Parse_Action is
when Navigate =>
null;
when Face =>
Face_Apply_Action (Parse_Data, Tree, Nonterm, (1 => (T5, 1, 2)));
when Indent =>
null;
end case;
end formal_derived_type_definition_10;
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)
is
Parse_Data : Wisi.Parse_Data_Type renames Wisi.Parse_Data_Type (User_Data);
T5 : constant SAL.Peek_Type := 3;
begin
case Parse_Data.Post_Parse_Action is
when Navigate =>
null;
when Face =>
Face_Apply_Action (Parse_Data, Tree, Nonterm, (1 => (T5, 1, 2)));
when Indent =>
null;
end case;
end formal_derived_type_definition_11;
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)
is
Parse_Data : Wisi.Parse_Data_Type renames Wisi.Parse_Data_Type (User_Data);
T5 : constant SAL.Peek_Type := 3;
begin
case Parse_Data.Post_Parse_Action is
when Navigate =>
null;
when Face =>
Face_Apply_Action (Parse_Data, Tree, Nonterm, (1 => (T5, 1, 2)));
when Indent =>
null;
end case;
end formal_derived_type_definition_12;
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)
is
Parse_Data : Wisi.Parse_Data_Type renames Wisi.Parse_Data_Type (User_Data);
T5 : constant SAL.Peek_Type := 3;
begin
case Parse_Data.Post_Parse_Action is
when Navigate =>
null;
when Face =>
Face_Apply_Action (Parse_Data, Tree, Nonterm, (1 => (T5, 1, 2)));
when Indent =>
null;
end case;
end formal_derived_type_definition_13;
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)
is
Parse_Data : Wisi.Parse_Data_Type renames Wisi.Parse_Data_Type (User_Data);
T5 : constant SAL.Peek_Type := 3;
begin
case Parse_Data.Post_Parse_Action is
when Navigate =>
null;
when Face =>
Face_Apply_Action (Parse_Data, Tree, Nonterm, (1 => (T5, 1, 2)));
when Indent =>
null;
end case;
end formal_derived_type_definition_14;
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)
is
Parse_Data : Wisi.Parse_Data_Type renames Wisi.Parse_Data_Type (User_Data);
T5 : constant SAL.Peek_Type := 2;
begin
case Parse_Data.Post_Parse_Action is
when Navigate =>
null;
when Face =>
Face_Apply_Action (Parse_Data, Tree, Nonterm, (1 => (T5, 1, 2)));
when Indent =>
null;
end case;
end formal_derived_type_definition_15;
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)
is
Parse_Data : Wisi.Parse_Data_Type renames Wisi.Parse_Data_Type (User_Data);
T5 : constant SAL.Peek_Type := 2;
begin
case Parse_Data.Post_Parse_Action is
when Navigate =>
null;
when Face =>
Face_Apply_Action (Parse_Data, Tree, Nonterm, (1 => (T5, 1, 2)));
when Indent =>
null;
end case;
end formal_derived_type_definition_16;
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)
is
Parse_Data : Wisi.Parse_Data_Type renames Wisi.Parse_Data_Type (User_Data);
T5 : constant SAL.Peek_Type := 2;
begin
case Parse_Data.Post_Parse_Action is
when Navigate =>
null;
when Face =>
Face_Apply_Action (Parse_Data, Tree, Nonterm, (1 => (T5, 1, 2)));
when Indent =>
null;
end case;
end formal_derived_type_definition_17;
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)
is
Parse_Data : Wisi.Parse_Data_Type renames Wisi.Parse_Data_Type (User_Data);
T1 : constant SAL.Peek_Type := 1;
T2 : constant SAL.Peek_Type := 2;
T3 : constant SAL.Peek_Type := 3;
T4 : constant SAL.Peek_Type := 4;
T5 : constant SAL.Peek_Type := 5;
T6 : constant SAL.Peek_Type := 6;
begin
case Parse_Data.Post_Parse_Action is
when Navigate =>
Statement_Action (Parse_Data, Tree, Nonterm, ((T1, Statement_Start), (T6, Statement_End)));
when Face =>
null;
when Indent =>
Indent_Action_0 (Parse_Data, Tree, Nonterm, (T1 => (False, (Simple, (Label => None))), T2 => (False, (Simple,
(Label => None))), T3 => (False, (Simple, (Int, Ada_Indent_Broken))), T4 => (False, (Simple, (Int,
Ada_Indent_Broken))), T5 => (False, (Simple, (Int, Ada_Indent_Broken))), T6 => (False, (Simple, (Int,
Ada_Indent_Broken)))));
end case;
end formal_concrete_subprogram_declaration_0;
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)
is
Parse_Data : Wisi.Parse_Data_Type renames Wisi.Parse_Data_Type (User_Data);
T1 : constant SAL.Peek_Type := 1;
T2 : constant SAL.Peek_Type := 2;
T3 : constant SAL.Peek_Type := 3;
T4 : constant SAL.Peek_Type := 4;
T6 : constant SAL.Peek_Type := 5;
begin
case Parse_Data.Post_Parse_Action is
when Navigate =>
Statement_Action (Parse_Data, Tree, Nonterm, ((T1, Statement_Start), (T6, Statement_End)));
when Face =>
null;
when Indent =>
Indent_Action_0 (Parse_Data, Tree, Nonterm, (T1 => (False, (Simple, (Label => None))), T2 => (False, (Simple,
(Label => None))), T3 => (False, (Simple, (Int, Ada_Indent_Broken))), T4 => (False, (Simple, (Int,
Ada_Indent_Broken))), T6 => (False, (Simple, (Int, Ada_Indent_Broken)))));
end case;
end formal_concrete_subprogram_declaration_1;
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)
is
Parse_Data : Wisi.Parse_Data_Type renames Wisi.Parse_Data_Type (User_Data);
T1 : constant SAL.Peek_Type := 1;
T2 : constant SAL.Peek_Type := 2;
T5 : constant SAL.Peek_Type := 3;
T6 : constant SAL.Peek_Type := 4;
begin
case Parse_Data.Post_Parse_Action is
when Navigate =>
Statement_Action (Parse_Data, Tree, Nonterm, ((T1, Statement_Start), (T6, Statement_End)));
when Face =>
null;
when Indent =>
Indent_Action_0 (Parse_Data, Tree, Nonterm, (T1 => (False, (Simple, (Label => None))), T2 => (False, (Simple,
(Label => None))), T5 => (False, (Simple, (Int, Ada_Indent_Broken))), T6 => (False, (Simple, (Int,
Ada_Indent_Broken)))));
end case;
end formal_concrete_subprogram_declaration_2;
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)
is
Parse_Data : Wisi.Parse_Data_Type renames Wisi.Parse_Data_Type (User_Data);
T1 : constant SAL.Peek_Type := 1;
T2 : constant SAL.Peek_Type := 2;
T6 : constant SAL.Peek_Type := 3;
begin
case Parse_Data.Post_Parse_Action is
when Navigate =>
Statement_Action (Parse_Data, Tree, Nonterm, ((T1, Statement_Start), (T6, Statement_End)));
when Face =>
null;
when Indent =>
Indent_Action_0 (Parse_Data, Tree, Nonterm, (T1 => (False, (Simple, (Label => None))), T2 => (False, (Simple,
(Label => None))), T6 => (False, (Simple, (Int, Ada_Indent_Broken)))));
end case;
end formal_concrete_subprogram_declaration_3;
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)
is
Parse_Data : Wisi.Parse_Data_Type renames Wisi.Parse_Data_Type (User_Data);
T1 : constant SAL.Peek_Type := 1;
T2 : constant SAL.Peek_Type := 2;
T3 : constant SAL.Peek_Type := 3;
T4 : constant SAL.Peek_Type := 4;
T5 : constant SAL.Peek_Type := 5;
T6 : constant SAL.Peek_Type := 6;
T7 : constant SAL.Peek_Type := 7;
begin
case Parse_Data.Post_Parse_Action is
when Navigate =>
Statement_Action (Parse_Data, Tree, Nonterm, ((T1, Statement_Start), (T7, Statement_End)));
when Face =>
null;
when Indent =>
Indent_Action_0 (Parse_Data, Tree, Nonterm, (T1 => (False, (Simple, (Label => None))), T2 => (False, (Simple,
(Label => None))), T3 => (False, (Simple, (Int, Ada_Indent_Broken))), T4 => (False, (Simple, (Int,
Ada_Indent_Broken))), T5 => (False, (Simple, (Int, Ada_Indent_Broken))), T6 => (False, (Simple, (Int,
Ada_Indent_Broken))), T7 => (False, (Simple, (Int, Ada_Indent_Broken)))));
end case;
end formal_abstract_subprogram_declaration_0;
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)
is
Parse_Data : Wisi.Parse_Data_Type renames Wisi.Parse_Data_Type (User_Data);
T1 : constant SAL.Peek_Type := 1;
T2 : constant SAL.Peek_Type := 2;
T3 : constant SAL.Peek_Type := 3;
T4 : constant SAL.Peek_Type := 4;
T5 : constant SAL.Peek_Type := 5;
T7 : constant SAL.Peek_Type := 6;
begin
case Parse_Data.Post_Parse_Action is
when Navigate =>
Statement_Action (Parse_Data, Tree, Nonterm, ((T1, Statement_Start), (T7, Statement_End)));
when Face =>
null;
when Indent =>
Indent_Action_0 (Parse_Data, Tree, Nonterm, (T1 => (False, (Simple, (Label => None))), T2 => (False, (Simple,
(Label => None))), T3 => (False, (Simple, (Int, Ada_Indent_Broken))), T4 => (False, (Simple, (Int,
Ada_Indent_Broken))), T5 => (False, (Simple, (Int, Ada_Indent_Broken))), T7 => (False, (Simple, (Int,
Ada_Indent_Broken)))));
end case;
end formal_abstract_subprogram_declaration_1;
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)
is
Parse_Data : Wisi.Parse_Data_Type renames Wisi.Parse_Data_Type (User_Data);
T1 : constant SAL.Peek_Type := 1;
T2 : constant SAL.Peek_Type := 2;
T3 : constant SAL.Peek_Type := 3;
T4 : constant SAL.Peek_Type := 4;
T6 : constant SAL.Peek_Type := 5;
T7 : constant SAL.Peek_Type := 6;
begin
case Parse_Data.Post_Parse_Action is
when Navigate =>
Statement_Action (Parse_Data, Tree, Nonterm, ((T1, Statement_Start), (T7, Statement_End)));
when Face =>
null;
when Indent =>
Indent_Action_0 (Parse_Data, Tree, Nonterm, (T1 => (False, (Simple, (Label => None))), T2 => (False, (Simple,
(Label => None))), T3 => (False, (Simple, (Int, Ada_Indent_Broken))), T4 => (False, (Simple, (Int,
Ada_Indent_Broken))), T6 => (False, (Simple, (Int, Ada_Indent_Broken))), T7 => (False, (Simple, (Int,
Ada_Indent_Broken)))));
end case;
end formal_abstract_subprogram_declaration_2;
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)
is
Parse_Data : Wisi.Parse_Data_Type renames Wisi.Parse_Data_Type (User_Data);
T1 : constant SAL.Peek_Type := 1;
T2 : constant SAL.Peek_Type := 2;
T3 : constant SAL.Peek_Type := 3;
T4 : constant SAL.Peek_Type := 4;
T7 : constant SAL.Peek_Type := 5;
begin
case Parse_Data.Post_Parse_Action is
when Navigate =>
Statement_Action (Parse_Data, Tree, Nonterm, ((T1, Statement_Start), (T7, Statement_End)));
when Face =>
null;
when Indent =>
Indent_Action_0 (Parse_Data, Tree, Nonterm, (T1 => (False, (Simple, (Label => None))), T2 => (False, (Simple,
(Label => None))), T3 => (False, (Simple, (Int, Ada_Indent_Broken))), T4 => (False, (Simple, (Int,
Ada_Indent_Broken))), T7 => (False, (Simple, (Int, Ada_Indent_Broken)))));
end case;
end formal_abstract_subprogram_declaration_3;
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)
is
Parse_Data : Wisi.Parse_Data_Type renames Wisi.Parse_Data_Type (User_Data);
begin
case Parse_Data.Post_Parse_Action is
when Navigate =>
null;
when Face =>
Face_Apply_Action (Parse_Data, Tree, Nonterm, (1 => (1, 1, 1)));
when Indent =>
null;
end case;
end default_name_0;
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)
is
Parse_Data : Wisi.Parse_Data_Type renames Wisi.Parse_Data_Type (User_Data);
T1 : constant SAL.Peek_Type := 1;
T2 : constant SAL.Peek_Type := 2;
T3 : constant SAL.Peek_Type := 3;
T4 : constant SAL.Peek_Type := 4;
T5 : constant SAL.Peek_Type := 5;
T6 : constant SAL.Peek_Type := 6;
T7 : constant SAL.Peek_Type := 7;
T8 : constant SAL.Peek_Type := 8;
begin
case Parse_Data.Post_Parse_Action is
when Navigate =>
Statement_Action (Parse_Data, Tree, Nonterm, ((T1, Statement_Start), (T8, Statement_End)));
when Face =>
Face_Apply_Action (Parse_Data, Tree, Nonterm, ((T3, 1, 1), (T6, 1, 1)));
when Indent =>
Indent_Action_0 (Parse_Data, Tree, Nonterm, (T1 => (False, (Simple, (Label => None))), T2 => (False, (Simple,
(Int, Ada_Indent_Broken))), T3 => (False, (Simple, (Int, Ada_Indent_Broken))), T4 => (False, (Simple, (Int,
Ada_Indent_Broken))), T5 => (False, (Simple, (Int, Ada_Indent_Broken))), T6 => (False, (Hanging_2, (Int,
Ada_Indent_Broken), (Int, Ada_Indent_Broken))), T7 => (False, (Simple, (Int, Ada_Indent_Broken))), T8 =>
(False, (Simple, (Int, Ada_Indent_Broken)))));
end case;
end formal_package_declaration_0;
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)
is
Parse_Data : Wisi.Parse_Data_Type renames Wisi.Parse_Data_Type (User_Data);
T1 : constant SAL.Peek_Type := 1;
T2 : constant SAL.Peek_Type := 2;
T3 : constant SAL.Peek_Type := 3;
T4 : constant SAL.Peek_Type := 4;
T5 : constant SAL.Peek_Type := 5;
T6 : constant SAL.Peek_Type := 6;
T8 : constant SAL.Peek_Type := 7;
begin
case Parse_Data.Post_Parse_Action is
when Navigate =>
Statement_Action (Parse_Data, Tree, Nonterm, ((T1, Statement_Start), (T8, Statement_End)));
when Face =>
Face_Apply_Action (Parse_Data, Tree, Nonterm, ((T3, 1, 1), (T6, 1, 1)));
when Indent =>
Indent_Action_0 (Parse_Data, Tree, Nonterm, (T1 => (False, (Simple, (Label => None))), T2 => (False, (Simple,
(Int, Ada_Indent_Broken))), T3 => (False, (Simple, (Int, Ada_Indent_Broken))), T4 => (False, (Simple, (Int,
Ada_Indent_Broken))), T5 => (False, (Simple, (Int, Ada_Indent_Broken))), T6 => (False, (Hanging_2, (Int,
Ada_Indent_Broken), (Int, Ada_Indent_Broken))), T8 => (False, (Simple, (Int, Ada_Indent_Broken)))));
end case;
end formal_package_declaration_1;
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)
is
Parse_Data : Wisi.Parse_Data_Type renames Wisi.Parse_Data_Type (User_Data);
T1 : constant SAL.Peek_Type := 1;
T2 : constant SAL.Peek_Type := 2;
T3 : constant SAL.Peek_Type := 3;
begin
case Parse_Data.Post_Parse_Action is
when Navigate =>
null;
when Face =>
null;
when Indent =>
Indent_Action_0 (Parse_Data, Tree, Nonterm, (T1 => (False, (Simple, (Label => None))), T2 => (False, (Simple,
(Label => None))), T3 => (False, (Simple, (Language, Ada_Indent_Aspect'Access, Null_Args)))));
end case;
end aspect_association_0;
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)
is
Parse_Data : Wisi.Parse_Data_Type renames Wisi.Parse_Data_Type (User_Data);
T1 : constant SAL.Peek_Type := 1;
begin
case Parse_Data.Post_Parse_Action is
when Navigate =>
null;
when Face =>
null;
when Indent =>
Indent_Action_0 (Parse_Data, Tree, Nonterm, (T1 => (False, (Simple, (Label => None)))));
end case;
end aspect_association_1;
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)
is
Parse_Data : Wisi.Parse_Data_Type renames Wisi.Parse_Data_Type (User_Data);
T1 : constant SAL.Peek_Type := 1;
T2 : constant SAL.Peek_Type := 2;
begin
case Parse_Data.Post_Parse_Action is
when Navigate =>
null;
when Face =>
null;
when Indent =>
Indent_Action_0 (Parse_Data, Tree, Nonterm, (T1 => (False, (Simple, (Label => None))), T2 => (False, (Simple,
(Int, Ada_Indent_Broken)))));
end case;
end aspect_specification_0;
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)
is
Parse_Data : Wisi.Parse_Data_Type renames Wisi.Parse_Data_Type (User_Data);
T1 : constant SAL.Peek_Type := 1;
T2 : constant SAL.Peek_Type := 2;
T3 : constant SAL.Peek_Type := 3;
T4 : constant SAL.Peek_Type := 4;
T5 : constant SAL.Peek_Type := 5;
T6 : constant SAL.Peek_Type := 6;
T7 : constant SAL.Peek_Type := 7;
begin
case Parse_Data.Post_Parse_Action is
when Navigate =>
Statement_Action (Parse_Data, Tree, Nonterm, ((T1, Statement_Start), (T7, Statement_End)));
when Face =>
null;
when Indent =>
Indent_Action_0 (Parse_Data, Tree, Nonterm, (T1 => (False, (Simple, (Label => None))), T2 => (False, (Simple,
(Int, Ada_Indent_Broken))), T3 => (False, (Simple, (Int, Ada_Indent_Broken))), T4 => (False, (Simple, (Int,
Ada_Indent_Broken))), T5 => (False, (Simple, (Int, Ada_Indent_Broken))), T6 => (False, (Simple, (Int,
Ada_Indent_Broken))), T7 => (False, (Simple, (Label => None)))));
end case;
end attribute_definition_clause_0;
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)
is
Parse_Data : Wisi.Parse_Data_Type renames Wisi.Parse_Data_Type (User_Data);
T1 : constant SAL.Peek_Type := 1;
T2 : constant SAL.Peek_Type := 2;
T3 : constant SAL.Peek_Type := 3;
T4 : constant SAL.Peek_Type := 4;
T5 : constant SAL.Peek_Type := 5;
begin
case Parse_Data.Post_Parse_Action is
when Navigate =>
Statement_Action (Parse_Data, Tree, Nonterm, ((T1, Statement_Start), (T5, Statement_End)));
when Face =>
Face_Apply_Action (Parse_Data, Tree, Nonterm, (1 => (T2, 1, 2)));
when Indent =>
Indent_Action_0 (Parse_Data, Tree, Nonterm, (T1 => (False, (Simple, (Label => None))), T2 => (False,
(Hanging_2, (Int, Ada_Indent_Broken), (Int, Ada_Indent_Broken))), T3 => (False, (Simple, (Int,
Ada_Indent_Broken))), T4 => (False, (Simple, (Int, Ada_Indent_Broken))), T5 => (False, (Simple, (Int,
Ada_Indent_Broken)))));
end case;
end enumeration_representation_clause_0;
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)
is
Parse_Data : Wisi.Parse_Data_Type renames Wisi.Parse_Data_Type (User_Data);
T1 : constant SAL.Peek_Type := 1;
T2 : constant SAL.Peek_Type := 2;
T3 : constant SAL.Peek_Type := 3;
T4 : constant SAL.Peek_Type := 4;
T5 : constant SAL.Peek_Type := 5;
T6 : constant SAL.Peek_Type := 6;
T7 : constant SAL.Peek_Type := 7;
T8 : constant SAL.Peek_Type := 8;
T9 : constant SAL.Peek_Type := 9;
T10 : constant SAL.Peek_Type := 10;
begin
case Parse_Data.Post_Parse_Action is
when Navigate =>
Statement_Action (Parse_Data, Tree, Nonterm, ((T1, Statement_Start), (T10, Statement_End)));
when Face =>
Face_Apply_Action (Parse_Data, Tree, Nonterm, ((T2, 1, 2), (T9, 1, 2)));
when Indent =>
Indent_Action_0 (Parse_Data, Tree, Nonterm, (T1 => (False, (Simple, (Label => None))), T2 => (False,
(Hanging_2, (Int, Ada_Indent_Broken), (Int, Ada_Indent_Broken))), T3 => (False, (Simple, (Int,
Ada_Indent_Broken))), T4 => (True, (Simple, (Language, Ada_Indent_Record_1'Access, 51 & Integer (T4) & 0)),
(Simple, (Language, Ada_Indent_Record_1'Access, 51 & Integer (T4) & Ada_Indent))), T5 => (False, (Simple,
(Language, Ada_Indent_Record_0'Access, Integer (T1) & Integer (T4) & Ada_Indent))), T6 => (True, (Simple,
(Language, Ada_Indent_Record_1'Access, 51 & Integer (T4) & Ada_Indent)), (Simple, (Language,
Ada_Indent_Record_1'Access, 51 & Integer (T4) & Ada_Indent))), T7 => (False, (Simple, (Language,
Ada_Indent_Record_1'Access, 51 & Integer (T4) & 0))), T8 => (False, (Simple, (Int, Ada_Indent_Broken))), T9 =>
(False, (Hanging_2, (Int, Ada_Indent_Broken), (Int, Ada_Indent_Broken))), T10 => (False, (Simple, (Int,
Ada_Indent_Broken)))));
end case;
end record_representation_clause_0;
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)
is
Parse_Data : Wisi.Parse_Data_Type renames Wisi.Parse_Data_Type (User_Data);
T1 : constant SAL.Peek_Type := 1;
T2 : constant SAL.Peek_Type := 2;
T3 : constant SAL.Peek_Type := 3;
T4 : constant SAL.Peek_Type := 4;
T5 : constant SAL.Peek_Type := 5;
T6 : constant SAL.Peek_Type := 6;
T7 : constant SAL.Peek_Type := 7;
T8 : constant SAL.Peek_Type := 8;
T10 : constant SAL.Peek_Type := 9;
begin
case Parse_Data.Post_Parse_Action is
when Navigate =>
Statement_Action (Parse_Data, Tree, Nonterm, ((T1, Statement_Start), (T10, Statement_End)));
when Face =>
Face_Apply_Action (Parse_Data, Tree, Nonterm, (1 => (T2, 1, 2)));
when Indent =>
Indent_Action_0 (Parse_Data, Tree, Nonterm, (T1 => (False, (Simple, (Label => None))), T2 => (False,
(Hanging_2, (Int, Ada_Indent_Broken), (Int, Ada_Indent_Broken))), T3 => (False, (Simple, (Int,
Ada_Indent_Broken))), T4 => (True, (Simple, (Language, Ada_Indent_Record_1'Access, 51 & Integer (T4) & 0)),
(Simple, (Language, Ada_Indent_Record_1'Access, 51 & Integer (T4) & Ada_Indent))), T5 => (False, (Simple,
(Language, Ada_Indent_Record_0'Access, Integer (T1) & Integer (T4) & Ada_Indent))), T6 => (True, (Simple,
(Language, Ada_Indent_Record_1'Access, 51 & Integer (T4) & Ada_Indent)), (Simple, (Language,
Ada_Indent_Record_1'Access, 51 & Integer (T4) & Ada_Indent))), T7 => (False, (Simple, (Language,
Ada_Indent_Record_1'Access, 51 & Integer (T4) & 0))), T8 => (False, (Simple, (Int, Ada_Indent_Broken))), T10
=> (False, (Simple, (Int, Ada_Indent_Broken)))));
end case;
end record_representation_clause_1;
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)
is
Parse_Data : Wisi.Parse_Data_Type renames Wisi.Parse_Data_Type (User_Data);
T1 : constant SAL.Peek_Type := 1;
T2 : constant SAL.Peek_Type := 2;
T3 : constant SAL.Peek_Type := 3;
T4 : constant SAL.Peek_Type := 4;
T5 : constant SAL.Peek_Type := 5;
T7 : constant SAL.Peek_Type := 6;
T8 : constant SAL.Peek_Type := 7;
T9 : constant SAL.Peek_Type := 8;
T10 : constant SAL.Peek_Type := 9;
begin
case Parse_Data.Post_Parse_Action is
when Navigate =>
Statement_Action (Parse_Data, Tree, Nonterm, ((T1, Statement_Start), (T10, Statement_End)));
when Face =>
Face_Apply_Action (Parse_Data, Tree, Nonterm, ((T2, 1, 2), (T9, 1, 2)));
when Indent =>
Indent_Action_0 (Parse_Data, Tree, Nonterm, (T1 => (False, (Simple, (Label => None))), T2 => (False,
(Hanging_2, (Int, Ada_Indent_Broken), (Int, Ada_Indent_Broken))), T3 => (False, (Simple, (Int,
Ada_Indent_Broken))), T4 => (True, (Simple, (Language, Ada_Indent_Record_1'Access, 51 & Integer (T4) & 0)),
(Simple, (Language, Ada_Indent_Record_1'Access, 51 & Integer (T4) & Ada_Indent))), T5 => (False, (Simple,
(Language, Ada_Indent_Record_0'Access, Integer (T1) & Integer (T4) & Ada_Indent))), T7 => (False, (Simple,
(Language, Ada_Indent_Record_1'Access, 51 & Integer (T4) & 0))), T8 => (False, (Simple, (Int,
Ada_Indent_Broken))), T9 => (False, (Hanging_2, (Int, Ada_Indent_Broken), (Int, Ada_Indent_Broken))), T10 =>
(False, (Simple, (Int, Ada_Indent_Broken)))));
end case;
end record_representation_clause_2;
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)
is
Parse_Data : Wisi.Parse_Data_Type renames Wisi.Parse_Data_Type (User_Data);
T1 : constant SAL.Peek_Type := 1;
T2 : constant SAL.Peek_Type := 2;
T3 : constant SAL.Peek_Type := 3;
T4 : constant SAL.Peek_Type := 4;
T5 : constant SAL.Peek_Type := 5;
T7 : constant SAL.Peek_Type := 6;
T8 : constant SAL.Peek_Type := 7;
T10 : constant SAL.Peek_Type := 8;
begin
case Parse_Data.Post_Parse_Action is
when Navigate =>
Statement_Action (Parse_Data, Tree, Nonterm, ((T1, Statement_Start), (T10, Statement_End)));
when Face =>
Face_Apply_Action (Parse_Data, Tree, Nonterm, (1 => (T2, 1, 2)));
when Indent =>
Indent_Action_0 (Parse_Data, Tree, Nonterm, (T1 => (False, (Simple, (Label => None))), T2 => (False,
(Hanging_2, (Int, Ada_Indent_Broken), (Int, Ada_Indent_Broken))), T3 => (False, (Simple, (Int,
Ada_Indent_Broken))), T4 => (True, (Simple, (Language, Ada_Indent_Record_1'Access, 51 & Integer (T4) & 0)),
(Simple, (Language, Ada_Indent_Record_1'Access, 51 & Integer (T4) & Ada_Indent))), T5 => (False, (Simple,
(Language, Ada_Indent_Record_0'Access, Integer (T1) & Integer (T4) & Ada_Indent))), T7 => (False, (Simple,
(Language, Ada_Indent_Record_1'Access, 51 & Integer (T4) & 0))), T8 => (False, (Simple, (Int,
Ada_Indent_Broken))), T10 => (False, (Simple, (Int, Ada_Indent_Broken)))));
end case;
end record_representation_clause_3;
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)
is
Parse_Data : Wisi.Parse_Data_Type renames Wisi.Parse_Data_Type (User_Data);
T1 : constant SAL.Peek_Type := 1;
T2 : constant SAL.Peek_Type := 2;
T3 : constant SAL.Peek_Type := 3;
T4 : constant SAL.Peek_Type := 4;
T6 : constant SAL.Peek_Type := 5;
T7 : constant SAL.Peek_Type := 6;
T8 : constant SAL.Peek_Type := 7;
T9 : constant SAL.Peek_Type := 8;
T10 : constant SAL.Peek_Type := 9;
begin
case Parse_Data.Post_Parse_Action is
when Navigate =>
Statement_Action (Parse_Data, Tree, Nonterm, ((T1, Statement_Start), (T10, Statement_End)));
when Face =>
Face_Apply_Action (Parse_Data, Tree, Nonterm, ((T2, 1, 2), (T9, 1, 2)));
when Indent =>
Indent_Action_0 (Parse_Data, Tree, Nonterm, (T1 => (False, (Simple, (Label => None))), T2 => (False,
(Hanging_2, (Int, Ada_Indent_Broken), (Int, Ada_Indent_Broken))), T3 => (False, (Simple, (Int,
Ada_Indent_Broken))), T4 => (True, (Simple, (Language, Ada_Indent_Record_1'Access, 51 & Integer (T4) & 0)),
(Simple, (Language, Ada_Indent_Record_1'Access, 51 & Integer (T4) & Ada_Indent))), T6 => (True, (Simple,
(Language, Ada_Indent_Record_1'Access, 51 & Integer (T4) & Ada_Indent)), (Simple, (Language,
Ada_Indent_Record_1'Access, 51 & Integer (T4) & Ada_Indent))), T7 => (False, (Simple, (Language,
Ada_Indent_Record_1'Access, 51 & Integer (T4) & 0))), T8 => (False, (Simple, (Int, Ada_Indent_Broken))), T9 =>
(False, (Hanging_2, (Int, Ada_Indent_Broken), (Int, Ada_Indent_Broken))), T10 => (False, (Simple, (Int,
Ada_Indent_Broken)))));
end case;
end record_representation_clause_4;
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)
is
Parse_Data : Wisi.Parse_Data_Type renames Wisi.Parse_Data_Type (User_Data);
T1 : constant SAL.Peek_Type := 1;
T2 : constant SAL.Peek_Type := 2;
T3 : constant SAL.Peek_Type := 3;
T4 : constant SAL.Peek_Type := 4;
T6 : constant SAL.Peek_Type := 5;
T7 : constant SAL.Peek_Type := 6;
T8 : constant SAL.Peek_Type := 7;
T10 : constant SAL.Peek_Type := 8;
begin
case Parse_Data.Post_Parse_Action is
when Navigate =>
Statement_Action (Parse_Data, Tree, Nonterm, ((T1, Statement_Start), (T10, Statement_End)));
when Face =>
Face_Apply_Action (Parse_Data, Tree, Nonterm, (1 => (T2, 1, 2)));
when Indent =>
Indent_Action_0 (Parse_Data, Tree, Nonterm, (T1 => (False, (Simple, (Label => None))), T2 => (False,
(Hanging_2, (Int, Ada_Indent_Broken), (Int, Ada_Indent_Broken))), T3 => (False, (Simple, (Int,
Ada_Indent_Broken))), T4 => (True, (Simple, (Language, Ada_Indent_Record_1'Access, 51 & Integer (T4) & 0)),
(Simple, (Language, Ada_Indent_Record_1'Access, 51 & Integer (T4) & Ada_Indent))), T6 => (True, (Simple,
(Language, Ada_Indent_Record_1'Access, 51 & Integer (T4) & Ada_Indent)), (Simple, (Language,
Ada_Indent_Record_1'Access, 51 & Integer (T4) & Ada_Indent))), T7 => (False, (Simple, (Language,
Ada_Indent_Record_1'Access, 51 & Integer (T4) & 0))), T8 => (False, (Simple, (Int, Ada_Indent_Broken))), T10
=> (False, (Simple, (Int, Ada_Indent_Broken)))));
end case;
end record_representation_clause_5;
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)
is
Parse_Data : Wisi.Parse_Data_Type renames Wisi.Parse_Data_Type (User_Data);
T1 : constant SAL.Peek_Type := 1;
T2 : constant SAL.Peek_Type := 2;
T3 : constant SAL.Peek_Type := 3;
T4 : constant SAL.Peek_Type := 4;
T7 : constant SAL.Peek_Type := 5;
T8 : constant SAL.Peek_Type := 6;
T9 : constant SAL.Peek_Type := 7;
T10 : constant SAL.Peek_Type := 8;
begin
case Parse_Data.Post_Parse_Action is
when Navigate =>
Statement_Action (Parse_Data, Tree, Nonterm, ((T1, Statement_Start), (T10, Statement_End)));
when Face =>
Face_Apply_Action (Parse_Data, Tree, Nonterm, ((T2, 1, 2), (T9, 1, 2)));
when Indent =>
Indent_Action_0 (Parse_Data, Tree, Nonterm, (T1 => (False, (Simple, (Label => None))), T2 => (False,
(Hanging_2, (Int, Ada_Indent_Broken), (Int, Ada_Indent_Broken))), T3 => (False, (Simple, (Int,
Ada_Indent_Broken))), T4 => (True, (Simple, (Language, Ada_Indent_Record_1'Access, 51 & Integer (T4) & 0)),
(Simple, (Language, Ada_Indent_Record_1'Access, 51 & Integer (T4) & Ada_Indent))), T7 => (False, (Simple,
(Language, Ada_Indent_Record_1'Access, 51 & Integer (T4) & 0))), T8 => (False, (Simple, (Int,
Ada_Indent_Broken))), T9 => (False, (Hanging_2, (Int, Ada_Indent_Broken), (Int, Ada_Indent_Broken))), T10 =>
(False, (Simple, (Int, Ada_Indent_Broken)))));
end case;
end record_representation_clause_6;
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)
is
Parse_Data : Wisi.Parse_Data_Type renames Wisi.Parse_Data_Type (User_Data);
T1 : constant SAL.Peek_Type := 1;
T2 : constant SAL.Peek_Type := 2;
T3 : constant SAL.Peek_Type := 3;
T4 : constant SAL.Peek_Type := 4;
T7 : constant SAL.Peek_Type := 5;
T8 : constant SAL.Peek_Type := 6;
T10 : constant SAL.Peek_Type := 7;
begin
case Parse_Data.Post_Parse_Action is
when Navigate =>
Statement_Action (Parse_Data, Tree, Nonterm, ((T1, Statement_Start), (T10, Statement_End)));
when Face =>
Face_Apply_Action (Parse_Data, Tree, Nonterm, (1 => (T2, 1, 2)));
when Indent =>
Indent_Action_0 (Parse_Data, Tree, Nonterm, (T1 => (False, (Simple, (Label => None))), T2 => (False,
(Hanging_2, (Int, Ada_Indent_Broken), (Int, Ada_Indent_Broken))), T3 => (False, (Simple, (Int,
Ada_Indent_Broken))), T4 => (True, (Simple, (Language, Ada_Indent_Record_1'Access, 51 & Integer (T4) & 0)),
(Simple, (Language, Ada_Indent_Record_1'Access, 51 & Integer (T4) & Ada_Indent))), T7 => (False, (Simple,
(Language, Ada_Indent_Record_1'Access, 51 & Integer (T4) & 0))), T8 => (False, (Simple, (Int,
Ada_Indent_Broken))), T10 => (False, (Simple, (Int, Ada_Indent_Broken)))));
end case;
end record_representation_clause_7;
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)
is
Parse_Data : Wisi.Parse_Data_Type renames Wisi.Parse_Data_Type (User_Data);
T1 : constant SAL.Peek_Type := 1;
T2 : constant SAL.Peek_Type := 2;
T3 : constant SAL.Peek_Type := 3;
T4 : constant SAL.Peek_Type := 4;
T5 : constant SAL.Peek_Type := 5;
T6 : constant SAL.Peek_Type := 6;
T7 : constant SAL.Peek_Type := 7;
T8 : constant SAL.Peek_Type := 8;
begin
case Parse_Data.Post_Parse_Action is
when Navigate =>
Statement_Action (Parse_Data, Tree, Nonterm, ((T1, Statement_Start), (T8, Statement_End)));
when Face =>
null;
when Indent =>
Indent_Action_0 (Parse_Data, Tree, Nonterm, (T1 => (False, (Simple, (Label => None))), T2 => (False, (Simple,
(Int, Ada_Indent_Broken))), T3 => (False, (Simple, (Int, Ada_Indent_Broken))), T4 => (False, (Simple, (Int,
Ada_Indent_Broken))), T5 => (False, (Simple, (Int, Ada_Indent_Broken))), T6 => (False, (Simple, (Int,
Ada_Indent_Broken))), T7 => (False, (Simple, (Int, Ada_Indent_Broken))), T8 => (False, (Simple, (Int,
Ada_Indent_Broken)))));
end case;
end component_clause_0;
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)
is
Parse_Data : Wisi.Parse_Data_Type renames Wisi.Parse_Data_Type (User_Data);
T1 : constant SAL.Peek_Type := 1;
T2 : constant SAL.Peek_Type := 2;
T3 : constant SAL.Peek_Type := 3;
begin
case Parse_Data.Post_Parse_Action is
when Navigate =>
null;
when Face =>
null;
when Indent =>
Indent_Action_0 (Parse_Data, Tree, Nonterm, (T1 => (False, (Simple, (Label => None))), T2 => (False, (Simple,
(Int, Ada_Indent_Broken))), T3 => (False, (Simple, (Int, Ada_Indent_Broken)))));
end case;
end delta_constraint_0;
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)
is
Parse_Data : Wisi.Parse_Data_Type renames Wisi.Parse_Data_Type (User_Data);
T1 : constant SAL.Peek_Type := 1;
T2 : constant SAL.Peek_Type := 2;
begin
case Parse_Data.Post_Parse_Action is
when Navigate =>
null;
when Face =>
null;
when Indent =>
Indent_Action_0 (Parse_Data, Tree, Nonterm, (T1 => (False, (Simple, (Label => None))), T2 => (False, (Simple,
(Int, Ada_Indent_Broken)))));
end case;
end delta_constraint_1;
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)
is
Parse_Data : Wisi.Parse_Data_Type renames Wisi.Parse_Data_Type (User_Data);
T1 : constant SAL.Peek_Type := 1;
T6 : constant SAL.Peek_Type := 6;
begin
case Parse_Data.Post_Parse_Action is
when Navigate =>
Statement_Action (Parse_Data, Tree, Nonterm, ((T1, Statement_Start), (T6, Statement_End)));
when Face =>
null;
when Indent =>
null;
end case;
end at_clause_0;
end Ada_Annex_P_Process_Actions;
|
optikos/oasis | Ada | 5,150 | ads | -- Copyright (c) 2019 Maxim Reznik <[email protected]>
--
-- SPDX-License-Identifier: MIT
-- License-Filename: LICENSE
-------------------------------------------------------------
with Program.Lexical_Elements;
with Program.Elements.Expressions;
with Program.Elements.Elsif_Paths;
with Program.Elements.If_Expressions;
with Program.Element_Visitors;
package Program.Nodes.If_Expressions is
pragma Preelaborate;
type If_Expression is
new Program.Nodes.Node and Program.Elements.If_Expressions.If_Expression
and Program.Elements.If_Expressions.If_Expression_Text
with private;
function Create
(If_Token : not null Program.Lexical_Elements
.Lexical_Element_Access;
Condition : not null Program.Elements.Expressions.Expression_Access;
Then_Token : not null Program.Lexical_Elements
.Lexical_Element_Access;
Then_Expression : not null Program.Elements.Expressions.Expression_Access;
Elsif_Paths : Program.Elements.Elsif_Paths.Elsif_Path_Vector_Access;
Else_Token : Program.Lexical_Elements.Lexical_Element_Access;
Else_Expression : Program.Elements.Expressions.Expression_Access)
return If_Expression;
type Implicit_If_Expression is
new Program.Nodes.Node and Program.Elements.If_Expressions.If_Expression
with private;
function Create
(Condition : not null Program.Elements.Expressions
.Expression_Access;
Then_Expression : not null Program.Elements.Expressions
.Expression_Access;
Elsif_Paths : Program.Elements.Elsif_Paths
.Elsif_Path_Vector_Access;
Else_Expression : Program.Elements.Expressions.Expression_Access;
Is_Part_Of_Implicit : Boolean := False;
Is_Part_Of_Inherited : Boolean := False;
Is_Part_Of_Instance : Boolean := False)
return Implicit_If_Expression
with Pre =>
Is_Part_Of_Implicit or Is_Part_Of_Inherited or Is_Part_Of_Instance;
private
type Base_If_Expression is
abstract new Program.Nodes.Node
and Program.Elements.If_Expressions.If_Expression
with record
Condition : not null Program.Elements.Expressions
.Expression_Access;
Then_Expression : not null Program.Elements.Expressions
.Expression_Access;
Elsif_Paths : Program.Elements.Elsif_Paths
.Elsif_Path_Vector_Access;
Else_Expression : Program.Elements.Expressions.Expression_Access;
end record;
procedure Initialize (Self : aliased in out Base_If_Expression'Class);
overriding procedure Visit
(Self : not null access Base_If_Expression;
Visitor : in out Program.Element_Visitors.Element_Visitor'Class);
overriding function Condition
(Self : Base_If_Expression)
return not null Program.Elements.Expressions.Expression_Access;
overriding function Then_Expression
(Self : Base_If_Expression)
return not null Program.Elements.Expressions.Expression_Access;
overriding function Elsif_Paths
(Self : Base_If_Expression)
return Program.Elements.Elsif_Paths.Elsif_Path_Vector_Access;
overriding function Else_Expression
(Self : Base_If_Expression)
return Program.Elements.Expressions.Expression_Access;
overriding function Is_If_Expression_Element
(Self : Base_If_Expression)
return Boolean;
overriding function Is_Expression_Element
(Self : Base_If_Expression)
return Boolean;
type If_Expression is
new Base_If_Expression
and Program.Elements.If_Expressions.If_Expression_Text
with record
If_Token : not null Program.Lexical_Elements.Lexical_Element_Access;
Then_Token : not null Program.Lexical_Elements.Lexical_Element_Access;
Else_Token : Program.Lexical_Elements.Lexical_Element_Access;
end record;
overriding function To_If_Expression_Text
(Self : aliased in out If_Expression)
return Program.Elements.If_Expressions.If_Expression_Text_Access;
overriding function If_Token
(Self : If_Expression)
return not null Program.Lexical_Elements.Lexical_Element_Access;
overriding function Then_Token
(Self : If_Expression)
return not null Program.Lexical_Elements.Lexical_Element_Access;
overriding function Else_Token
(Self : If_Expression)
return Program.Lexical_Elements.Lexical_Element_Access;
type Implicit_If_Expression is
new Base_If_Expression
with record
Is_Part_Of_Implicit : Boolean;
Is_Part_Of_Inherited : Boolean;
Is_Part_Of_Instance : Boolean;
end record;
overriding function To_If_Expression_Text
(Self : aliased in out Implicit_If_Expression)
return Program.Elements.If_Expressions.If_Expression_Text_Access;
overriding function Is_Part_Of_Implicit
(Self : Implicit_If_Expression)
return Boolean;
overriding function Is_Part_Of_Inherited
(Self : Implicit_If_Expression)
return Boolean;
overriding function Is_Part_Of_Instance
(Self : Implicit_If_Expression)
return Boolean;
end Program.Nodes.If_Expressions;
|
reznikmm/gela | Ada | 2,544 | adb | ------------------------------------------------------------------------------
-- G E L A G R A M M A R S --
-- Library for dealing with grammars for Gela project, --
-- a portable Ada compiler --
-- http://gela.ada-ru.org/ --
-- - - - - - - - - - - - - - - - --
-- Read copyright and license in gela.ads file --
------------------------------------------------------------------------------
with AG_Tools.Input;
package body AG_Tools.Generator_Factories is
Tail : constant League.Strings.Universal_String :=
League.Strings.To_Universal_String ("tail");
---------
-- Get --
---------
overriding function Get
(Self : access Factory;
NT : Anagram.Grammars.Non_Terminal)
return AG_Tools.Visit_Generators.NT_Generator_Access
is
begin
if Is_Converted_List (Self.Context.Grammar.all, NT) then
return Self.List'Access;
elsif AG_Tools.Input.Is_Concrete (NT.Index) then
return Self.NT'Access;
else
return Self.Abst'Access;
end if;
end Get;
---------
-- Get --
---------
overriding function Get
(Self : access Factory;
Part : Anagram.Grammars.Part)
return AG_Tools.Visit_Generators.Part_Generator_Access
is
use type League.Strings.Universal_String;
G : Anagram.Grammars.Grammar renames Self.Context.Grammar.all;
begin
if Part.Name = Tail then
return Self.Head'Access;
elsif not Part.Is_Terminal_Reference
and then Is_Converted_List (G, G.Non_Terminal (Part.Denote))
then
return Self.Seq'Access;
elsif AG_Tools.Input.Is_Option (G, Part) then
return Self.Opt'Access;
else
return Self.Part'Access;
end if;
end Get;
---------
-- Get --
---------
overriding function Get
(Self : access Factory;
Attr : Anagram.Grammars.Attribute;
NT : Anagram.Grammars.Non_Terminal)
return AG_Tools.Visit_Generators.Generator_Access
is
begin
if Attr.Is_Left_Hand_Side then
return AG_Tools.Visit_Generators.Generator_Access (Self.Get (NT));
else
return AG_Tools.Visit_Generators.Generator_Access
(Self.Get (Self.Context.Grammar.Part (Attr.Origin)));
end if;
end Get;
end AG_Tools.Generator_Factories;
|
caqg/linux-home | Ada | 1,921 | ads | -- Abstract :
--
-- Ada implementation of:
--
-- [1] gpr-wisi.el
-- [2] gpr-indent-user-options.el
--
-- Copyright (C) 2017 - 2022 Free Software Foundation, Inc.
--
-- 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.
pragma License (Modified_GPL);
package Wisi.Gpr is
Language_Protocol_Version : constant String := "1";
-- Defines the data passed to Initialize in Params.
--
-- This value must match gpr-wisi.el
-- gpr-wisi-language-protocol-version.
-- Indent parameters from [2]
Gpr_Indent : Integer := 3;
Gpr_Indent_Broken : Integer := 2;
Gpr_Indent_When : Integer := 3;
-- Other parameters
End_Names_Optional : Boolean := False;
type Parse_Data_Type is new Wisi.Parse_Data_Type with null record;
overriding
function New_User_Data (Template : in Parse_Data_Type) return WisiToken.Syntax_Trees.User_Data_Access
is (new Parse_Data_Type);
overriding
procedure Initialize (Data : in out Parse_Data_Type);
overriding
procedure Parse_Language_Params
(Data : in out Parse_Data_Type;
Params : in String);
overriding
function Get_Token_IDs
(User_Data : in Parse_Data_Type;
Command_Line : in String;
Last : in out Integer)
return WisiToken.Token_ID_Arrays.Vector;
end Wisi.Gpr;
|
AdaCore/libadalang | Ada | 620 | adb | with Ghost_Library_Pkg.Child;
procedure Ghost_Code is
function Foo return Integer is (12) with Ghost;
type Rec is record
A : Integer;
B : Integer;
end record with Ghost;
R : Rec := (12, Foo) with Ghost;
D : Integer with Ghost;
package Ghost_Pkg with Ghost is
A : Integer := 12;
end Ghost_Pkg;
package body Ghost_Pkg is
begin
A := 15;
pragma Assert (True);
pragma Assume (True);
loop
pragma Loop_Invariant (True);
end loop;
end Ghost_Pkg;
begin
R := (16, 18);
D := Foo;
Ghost_Library_Pkg.Child.A := 12;
end Ghost_Code;
|
DrenfongWong/tkm-rpc | Ada | 2,451 | ads | with Tkmrpc.Types;
package Tkmrpc.Contexts.esa
is
type esa_State_Type is
(clean,
-- Initial clean state.
invalid,
-- Error state.
stale,
-- ESA context is stale.
selected,
-- ESA is selected.
active
-- ESP SA is active.
);
function Get_State
(Id : Types.esa_id_type)
return esa_State_Type
with
Pre => Is_Valid (Id);
function Is_Valid (Id : Types.esa_id_type) return Boolean;
-- Returns True if the given id has a valid value.
function Has_ae_id
(Id : Types.esa_id_type;
ae_id : Types.ae_id_type)
return Boolean
with
Pre => Is_Valid (Id);
-- Returns True if the context specified by id has the given
-- ae_id value.
function Has_ea_id
(Id : Types.esa_id_type;
ea_id : Types.ea_id_type)
return Boolean
with
Pre => Is_Valid (Id);
-- Returns True if the context specified by id has the given
-- ea_id value.
function Has_sp_id
(Id : Types.esa_id_type;
sp_id : Types.sp_id_type)
return Boolean
with
Pre => Is_Valid (Id);
-- Returns True if the context specified by id has the given
-- sp_id value.
function Has_State
(Id : Types.esa_id_type;
State : esa_State_Type)
return Boolean
with
Pre => Is_Valid (Id);
-- Returns True if the context specified by id has the given
-- State value.
procedure create
(Id : Types.esa_id_type;
ae_id : Types.ae_id_type;
ea_id : Types.ea_id_type;
sp_id : Types.sp_id_type)
with
Pre => Is_Valid (Id) and then
(Has_State (Id, clean)),
Post => Has_State (Id, active) and
Has_ae_id (Id, ae_id) and
Has_ea_id (Id, ea_id) and
Has_sp_id (Id, sp_id);
procedure invalidate
(Id : Types.esa_id_type)
with
Pre => Is_Valid (Id),
Post => Has_State (Id, invalid);
procedure reset
(Id : Types.esa_id_type)
with
Pre => Is_Valid (Id),
Post => Has_State (Id, clean);
procedure select_sa
(Id : Types.esa_id_type)
with
Pre => Is_Valid (Id) and then
(Has_State (Id, active)),
Post => Has_State (Id, selected);
procedure unselect_sa
(Id : Types.esa_id_type)
with
Pre => Is_Valid (Id) and then
(Has_State (Id, selected)),
Post => Has_State (Id, active);
end Tkmrpc.Contexts.esa;
|
AdaCore/Ada_Drivers_Library | Ada | 6,642 | adb | ------------------------------------------------------------------------------
-- --
-- Copyright (C) 2015-2017, AdaCore --
-- --
-- Redistribution and use in source and binary forms, with or without --
-- modification, are permitted provided that the following conditions are --
-- met: --
-- 1. Redistributions of source code must retain the above copyright --
-- notice, this list of conditions and the following disclaimer. --
-- 2. Redistributions in binary form must reproduce the above copyright --
-- notice, this list of conditions and the following disclaimer in --
-- the documentation and/or other materials provided with the --
-- distribution. --
-- 3. Neither the name of the copyright holder nor the names of its --
-- contributors may be used to endorse or promote products derived --
-- from this software without specific prior written permission. --
-- --
-- THIS SOFTWARE IS PROVIDED BY THE COPYRIGHT HOLDERS AND CONTRIBUTORS --
-- "AS IS" AND ANY EXPRESS OR IMPLIED WARRANTIES, INCLUDING, BUT NOT --
-- LIMITED TO, THE IMPLIED WARRANTIES OF MERCHANTABILITY AND FITNESS FOR --
-- A PARTICULAR PURPOSE ARE DISCLAIMED. IN NO EVENT SHALL THE COPYRIGHT --
-- HOLDER OR CONTRIBUTORS BE LIABLE FOR ANY DIRECT, INDIRECT, INCIDENTAL, --
-- SPECIAL, EXEMPLARY, OR CONSEQUENTIAL DAMAGES (INCLUDING, BUT NOT --
-- LIMITED TO, PROCUREMENT OF SUBSTITUTE GOODS OR SERVICES; LOSS OF USE, --
-- DATA, OR PROFITS; OR BUSINESS INTERRUPTION) HOWEVER CAUSED AND ON ANY --
-- THEORY OF LIABILITY, WHETHER IN CONTRACT, STRICT LIABILITY, OR TORT --
-- (INCLUDING NEGLIGENCE OR OTHERWISE) ARISING IN ANY WAY OUT OF THE USE --
-- OF THIS SOFTWARE, EVEN IF ADVISED OF THE POSSIBILITY OF SUCH DAMAGE. --
-- --
------------------------------------------------------------------------------
with Interfaces; use Interfaces;
package body Filesystem.MBR is
----------
-- Read --
----------
function Read
(Controller : HAL.Block_Drivers.Any_Block_Driver;
MBR : out Master_Boot_Record)
return File_IO.Status_Code
is
Tmp : aliased Master_Boot_Record;
Data : aliased HAL.UInt8_Array (1 .. 512) with Address => Tmp'Address;
begin
-- Let's read the MBR: located in the first block
if not Controller.Read (0, Data) then
return File_IO.Disk_Error;
end if;
MBR := Tmp;
if MBR.Signature /= 16#AA55# then
return File_IO.No_MBR_Found;
end if;
return File_IO.OK;
end Read;
-------------------
-- Read_Extended --
-------------------
function Read_Extended
(Controller : HAL.Block_Drivers.Any_Block_Driver;
MBR : Master_Boot_Record;
P : Partition_Number;
EBR : out Extended_Boot_Record)
return File_IO.Status_Code
is
BA : constant Block_Number := LBA (MBR, P);
Tmp : aliased Extended_Boot_Record;
Data : aliased HAL.UInt8_Array (1 .. 512) with Address => Tmp'Address;
begin
-- Let's read the MBR: located in the first block
if not Controller.Read (HAL.UInt64 (BA), Data) then
return File_IO.Disk_Error;
end if;
EBR := Tmp;
if EBR.Signature /= 16#AA55# then
return File_IO.No_MBR_Found;
end if;
return File_IO.OK;
end Read_Extended;
------------
-- Active --
------------
function Active (MBR : Master_Boot_Record;
P : Partition_Number) return Boolean
is (MBR.P_Entries (P).Status = 16#80#);
-----------
-- Valid --
-----------
function Valid (MBR : Master_Boot_Record;
P : Partition_Number) return Boolean
is ((MBR.P_Entries (P).Status and not 16#80#) = 0);
--------------
-- Get_Type --
--------------
function Get_Type (MBR : Master_Boot_Record;
P : Partition_Number) return Partition_Type
is (MBR.P_Entries (P).P_Type);
---------
-- LBA --
---------
function LBA (MBR : Master_Boot_Record;
P : Partition_Number) return Block_Number
is (
-- MBR only supports 32-bit LBA. But as we want a generic FS interface
-- here, LBA is defined as a 64-bit number, hence the explicit cast
-- below.
Block_Number (MBR.P_Entries (P).LBA));
-------------
-- Sectors --
-------------
function Sectors (MBR : Master_Boot_Record;
P : Partition_Number) return Interfaces.Unsigned_32
is (MBR.P_Entries (P).Num_Sectors);
--------------
-- Get_Type --
--------------
function Get_Type (EBR : Extended_Boot_Record) return Partition_Type
is
begin
return EBR.P_Entries (1).P_Type;
end Get_Type;
---------
-- LBA --
---------
function LBA (EBR : Extended_Boot_Record) return Block_Number
is
begin
return Block_Number (EBR.P_Entries (1).LBA);
end LBA;
-------------
-- Sectors --
-------------
function Sectors (EBR : Extended_Boot_Record) return Interfaces.Unsigned_32
is
begin
return EBR.P_Entries (1).Num_Sectors;
end Sectors;
--------------
-- Has_Next --
--------------
function Has_Next (EBR : Extended_Boot_Record) return Boolean
is
begin
return EBR.P_Entries (2) /= Zeroed_Entry;
end Has_Next;
---------------
-- Read_Next --
---------------
function Read_Next
(Controller : HAL.Block_Drivers.Any_Block_Driver;
EBR : in out Extended_Boot_Record)
return File_IO.Status_Code
is
BA : constant Block_Number := Block_Number (EBR.P_Entries (2).LBA);
Tmp : aliased Extended_Boot_Record;
Data : aliased HAL.UInt8_Array (1 .. 512) with Address => Tmp'Address;
begin
-- Let's read the MBR: located in the first block
if not Controller.Read (BA, Data) then
return File_IO.Disk_Error;
end if;
EBR := Tmp;
if EBR.Signature /= 16#AA55# then
return File_IO.No_MBR_Found;
end if;
return File_IO.OK;
end Read_Next;
end Filesystem.MBR;
|
stcarrez/ada-asf | Ada | 2,058 | adb | -----------------------------------------------------------------------
-- components-ajax-factory -- Factory for AJAX Components
-- Copyright (C) 2011, 2018 Stephane Carrez
-- Written by Stephane Carrez ([email protected])
--
-- Licensed under the Apache License, Version 2.0 (the "License");
-- you may not use this file except in compliance with the License.
-- You may obtain a copy of the License at
--
-- http://www.apache.org/licenses/LICENSE-2.0
--
-- Unless required by applicable law or agreed to in writing, software
-- distributed under the License is distributed on an "AS IS" BASIS,
-- WITHOUT WARRANTIES OR CONDITIONS OF ANY KIND, either express or implied.
-- See the License for the specific language governing permissions and
-- limitations under the License.
-----------------------------------------------------------------------
with ASF.Components.Base;
with ASF.Views.Nodes;
with ASF.Components.Ajax.Includes;
package body ASF.Components.Ajax.Factory is
function Create_Include return Base.UIComponent_Access;
-- ------------------------------
-- Create an UIInclude component
-- ------------------------------
function Create_Include return Base.UIComponent_Access is
begin
return new ASF.Components.Ajax.Includes.UIInclude;
end Create_Include;
use ASF.Views.Nodes;
URI : aliased constant String := "http://code.google.com/p/ada-asf/ajax";
INCLUDE_TAG : aliased constant String := "include";
-- ------------------------------
-- Register the Ajax component factory.
-- ------------------------------
procedure Register (Factory : in out ASF.Factory.Component_Factory) is
begin
null;
ASF.Factory.Register (Factory,
URI => URI'Access,
Name => INCLUDE_TAG'Access,
Tag => Create_Component_Node'Access,
Create => Create_Include'Access);
end Register;
end ASF.Components.Ajax.Factory;
|
osannolik/Ada_Drivers_Library | Ada | 10,721 | ads | -- This spec has been automatically generated from STM32F446x.svd
pragma Restrictions (No_Elaboration_Code);
pragma Ada_2012;
pragma Style_Checks (Off);
with HAL;
with System;
package STM32_SVD.QUADSPI is
pragma Preelaborate;
---------------
-- Registers --
---------------
subtype CR_FTHRES_Field is HAL.UInt5;
subtype CR_PRESCALER_Field is HAL.UInt8;
-- control register
type CR_Register is record
-- Enable
EN : Boolean := False;
-- Abort request
ABORT_k : Boolean := False;
-- DMA enable
DMAEN : Boolean := False;
-- Timeout counter enable
TCEN : Boolean := False;
-- Sample shift
SSHIFT : Boolean := False;
-- unspecified
Reserved_5_5 : HAL.Bit := 16#0#;
-- Dual-flash mode
DFM : Boolean := False;
-- FLASH memory selection
FSEL : Boolean := False;
-- IFO threshold level
FTHRES : CR_FTHRES_Field := 16#0#;
-- unspecified
Reserved_13_15 : HAL.UInt3 := 16#0#;
-- Transfer error interrupt enable
TEIE : Boolean := False;
-- Transfer complete interrupt enable
TCIE : Boolean := False;
-- FIFO threshold interrupt enable
FTIE : Boolean := False;
-- Status match interrupt enable
SMIE : Boolean := False;
-- TimeOut interrupt enable
TOIE : Boolean := False;
-- unspecified
Reserved_21_21 : HAL.Bit := 16#0#;
-- Automatic poll mode stop
APMS : Boolean := False;
-- Polling match mode
PMM : Boolean := False;
-- Clock prescaler
PRESCALER : CR_PRESCALER_Field := 16#0#;
end record
with Volatile_Full_Access, Size => 32,
Bit_Order => System.Low_Order_First;
for CR_Register use record
EN at 0 range 0 .. 0;
ABORT_k at 0 range 1 .. 1;
DMAEN at 0 range 2 .. 2;
TCEN at 0 range 3 .. 3;
SSHIFT at 0 range 4 .. 4;
Reserved_5_5 at 0 range 5 .. 5;
DFM at 0 range 6 .. 6;
FSEL at 0 range 7 .. 7;
FTHRES at 0 range 8 .. 12;
Reserved_13_15 at 0 range 13 .. 15;
TEIE at 0 range 16 .. 16;
TCIE at 0 range 17 .. 17;
FTIE at 0 range 18 .. 18;
SMIE at 0 range 19 .. 19;
TOIE at 0 range 20 .. 20;
Reserved_21_21 at 0 range 21 .. 21;
APMS at 0 range 22 .. 22;
PMM at 0 range 23 .. 23;
PRESCALER at 0 range 24 .. 31;
end record;
subtype DCR_CSHT_Field is HAL.UInt3;
subtype DCR_FSIZE_Field is HAL.UInt5;
-- device configuration register
type DCR_Register is record
-- Mode 0 / mode 3
CKMODE : Boolean := False;
-- unspecified
Reserved_1_7 : HAL.UInt7 := 16#0#;
-- Chip select high time
CSHT : DCR_CSHT_Field := 16#0#;
-- unspecified
Reserved_11_15 : HAL.UInt5 := 16#0#;
-- FLASH memory size
FSIZE : DCR_FSIZE_Field := 16#0#;
-- unspecified
Reserved_21_31 : HAL.UInt11 := 16#0#;
end record
with Volatile_Full_Access, Size => 32,
Bit_Order => System.Low_Order_First;
for DCR_Register use record
CKMODE at 0 range 0 .. 0;
Reserved_1_7 at 0 range 1 .. 7;
CSHT at 0 range 8 .. 10;
Reserved_11_15 at 0 range 11 .. 15;
FSIZE at 0 range 16 .. 20;
Reserved_21_31 at 0 range 21 .. 31;
end record;
subtype SR_FLEVEL_Field is HAL.UInt7;
-- status register
type SR_Register is record
-- Read-only. Transfer error flag
TEF : Boolean;
-- Read-only. Transfer complete flag
TCF : Boolean;
-- Read-only. FIFO threshold flag
FTF : Boolean;
-- Read-only. Status match flag
SMF : Boolean;
-- Read-only. Timeout flag
TOF : Boolean;
-- Read-only. Busy
BUSY : Boolean;
-- unspecified
Reserved_6_7 : HAL.UInt2;
-- Read-only. FIFO level
FLEVEL : SR_FLEVEL_Field;
-- unspecified
Reserved_15_31 : HAL.UInt17;
end record
with Volatile_Full_Access, Size => 32,
Bit_Order => System.Low_Order_First;
for SR_Register use record
TEF at 0 range 0 .. 0;
TCF at 0 range 1 .. 1;
FTF at 0 range 2 .. 2;
SMF at 0 range 3 .. 3;
TOF at 0 range 4 .. 4;
BUSY at 0 range 5 .. 5;
Reserved_6_7 at 0 range 6 .. 7;
FLEVEL at 0 range 8 .. 14;
Reserved_15_31 at 0 range 15 .. 31;
end record;
-- flag clear register
type FCR_Register is record
-- Clear transfer error flag
CTEF : Boolean := False;
-- Clear transfer complete flag
CTCF : Boolean := False;
-- unspecified
Reserved_2_2 : HAL.Bit := 16#0#;
-- Clear status match flag
CSMF : Boolean := False;
-- Clear timeout flag
CTOF : Boolean := False;
-- unspecified
Reserved_5_31 : HAL.UInt27 := 16#0#;
end record
with Volatile_Full_Access, Size => 32,
Bit_Order => System.Low_Order_First;
for FCR_Register use record
CTEF at 0 range 0 .. 0;
CTCF at 0 range 1 .. 1;
Reserved_2_2 at 0 range 2 .. 2;
CSMF at 0 range 3 .. 3;
CTOF at 0 range 4 .. 4;
Reserved_5_31 at 0 range 5 .. 31;
end record;
subtype CCR_INSTRUCTION_Field is HAL.UInt8;
subtype CCR_IMODE_Field is HAL.UInt2;
subtype CCR_ADMODE_Field is HAL.UInt2;
subtype CCR_ADSIZE_Field is HAL.UInt2;
subtype CCR_ABMODE_Field is HAL.UInt2;
subtype CCR_ABSIZE_Field is HAL.UInt2;
subtype CCR_DCYC_Field is HAL.UInt5;
subtype CCR_DMODE_Field is HAL.UInt2;
subtype CCR_FMODE_Field is HAL.UInt2;
-- communication configuration register
type CCR_Register is record
-- Instruction
INSTRUCTION : CCR_INSTRUCTION_Field := 16#0#;
-- Instruction mode
IMODE : CCR_IMODE_Field := 16#0#;
-- Address mode
ADMODE : CCR_ADMODE_Field := 16#0#;
-- Address size
ADSIZE : CCR_ADSIZE_Field := 16#0#;
-- Alternate bytes mode
ABMODE : CCR_ABMODE_Field := 16#0#;
-- Alternate bytes size
ABSIZE : CCR_ABSIZE_Field := 16#0#;
-- Number of dummy cycles
DCYC : CCR_DCYC_Field := 16#0#;
-- unspecified
Reserved_23_23 : HAL.Bit := 16#0#;
-- Data mode
DMODE : CCR_DMODE_Field := 16#0#;
-- Functional mode
FMODE : CCR_FMODE_Field := 16#0#;
-- Send instruction only once mode
SIOO : Boolean := False;
-- unspecified
Reserved_29_29 : HAL.Bit := 16#0#;
-- DDR hold half cycle
DHHC : Boolean := False;
-- Double data rate mode
DDRM : Boolean := False;
end record
with Volatile_Full_Access, Size => 32,
Bit_Order => System.Low_Order_First;
for CCR_Register use record
INSTRUCTION at 0 range 0 .. 7;
IMODE at 0 range 8 .. 9;
ADMODE at 0 range 10 .. 11;
ADSIZE at 0 range 12 .. 13;
ABMODE at 0 range 14 .. 15;
ABSIZE at 0 range 16 .. 17;
DCYC at 0 range 18 .. 22;
Reserved_23_23 at 0 range 23 .. 23;
DMODE at 0 range 24 .. 25;
FMODE at 0 range 26 .. 27;
SIOO at 0 range 28 .. 28;
Reserved_29_29 at 0 range 29 .. 29;
DHHC at 0 range 30 .. 30;
DDRM at 0 range 31 .. 31;
end record;
subtype PIR_INTERVAL_Field is HAL.UInt16;
-- polling interval register
type PIR_Register is record
-- Polling interval
INTERVAL : PIR_INTERVAL_Field := 16#0#;
-- unspecified
Reserved_16_31 : HAL.UInt16 := 16#0#;
end record
with Volatile_Full_Access, Size => 32,
Bit_Order => System.Low_Order_First;
for PIR_Register use record
INTERVAL at 0 range 0 .. 15;
Reserved_16_31 at 0 range 16 .. 31;
end record;
subtype LPTR_TIMEOUT_Field is HAL.UInt16;
-- low-power timeout register
type LPTR_Register is record
-- Timeout period
TIMEOUT : LPTR_TIMEOUT_Field := 16#0#;
-- unspecified
Reserved_16_31 : HAL.UInt16 := 16#0#;
end record
with Volatile_Full_Access, Size => 32,
Bit_Order => System.Low_Order_First;
for LPTR_Register use record
TIMEOUT at 0 range 0 .. 15;
Reserved_16_31 at 0 range 16 .. 31;
end record;
-----------------
-- Peripherals --
-----------------
-- QuadSPI interface
type QUADSPI_Peripheral is record
-- control register
CR : aliased CR_Register;
-- device configuration register
DCR : aliased DCR_Register;
-- status register
SR : aliased SR_Register;
-- flag clear register
FCR : aliased FCR_Register;
-- data length register
DLR : aliased HAL.UInt32;
-- communication configuration register
CCR : aliased CCR_Register;
-- address register
AR : aliased HAL.UInt32;
-- ABR
ABR : aliased HAL.UInt32;
-- data register
DR : aliased HAL.UInt32;
-- polling status mask register
PSMKR : aliased HAL.UInt32;
-- polling status match register
PSMAR : aliased HAL.UInt32;
-- polling interval register
PIR : aliased PIR_Register;
-- low-power timeout register
LPTR : aliased LPTR_Register;
end record
with Volatile;
for QUADSPI_Peripheral use record
CR at 16#0# range 0 .. 31;
DCR at 16#4# range 0 .. 31;
SR at 16#8# range 0 .. 31;
FCR at 16#C# range 0 .. 31;
DLR at 16#10# range 0 .. 31;
CCR at 16#14# range 0 .. 31;
AR at 16#18# range 0 .. 31;
ABR at 16#1C# range 0 .. 31;
DR at 16#20# range 0 .. 31;
PSMKR at 16#24# range 0 .. 31;
PSMAR at 16#28# range 0 .. 31;
PIR at 16#2C# range 0 .. 31;
LPTR at 16#30# range 0 .. 31;
end record;
-- QuadSPI interface
QUADSPI_Periph : aliased QUADSPI_Peripheral
with Import, Address => System'To_Address (16#A0001000#);
end STM32_SVD.QUADSPI;
|
RREE/ada-util | Ada | 3,658 | ads | -----------------------------------------------------------------------
-- util-encoders-ecc -- Error Correction Code
-- Copyright (C) 2019 Stephane Carrez
-- Written by Stephane Carrez ([email protected])
--
-- Licensed under the Apache License, Version 2.0 (the "License");
-- you may not use this file except in compliance with the License.
-- You may obtain a copy of the License at
--
-- http://www.apache.org/licenses/LICENSE-2.0
--
-- Unless required by applicable law or agreed to in writing, software
-- distributed under the License is distributed on an "AS IS" BASIS,
-- WITHOUT WARRANTIES OR CONDITIONS OF ANY KIND, either express or implied.
-- See the License for the specific language governing permissions and
-- limitations under the License.
-----------------------------------------------------------------------
-- == Error Correction Code ==
-- The `Util.Encoders.ECC` package provides operations to support error correction codes.
-- The error correction works on blocks of 256 or 512 bytes and can detect 2-bit errors
-- and correct 1-bit error. The ECC uses only three additional bytes.
-- The ECC algorithm implemented by this package is implemented by several NAND Flash
-- memory. It can be used to increase the robustness of data to bit-tempering when
-- the data is restored from an external storage (note that if the external storage has
-- its own ECC correction, adding another software ECC correction will probably not help).
--
-- The ECC code is generated by using the `Make` procedure that gets a block of 256 or
-- 512 bytes and produces the 3 bytes ECC code. The ECC code must be saved together with
-- the data block.
--
-- Code : Util.Encoders.ECC.ECC_Code;
-- ...
-- Util.Encoders.ECC.Make (Data, Code);
--
-- When reading the data block, you can verify and correct it by running again the
-- `Make` procedure on the data block and then compare the current ECC code with the
-- expected ECC code produced by the first call. The `Correct` function is then called
-- with the data block, the expected ECC code that was saved with the data block and
-- the computed ECC code.
--
-- New_Code : Util.Encoders.ECC.ECC_Code;
-- ...
-- Util.Encoders.ECC.Make (Data, New_Code);
-- case Util.Encoders.ECC.Correct (Data, Expect_Code, New_Code) is
-- when NO_ERROR | CORRECTABLE_ERROR => ...
-- when others => ...
-- end case;
package Util.Encoders.ECC is
type ECC_Result is (NO_ERROR, CORRECTABLE_ERROR, UNCORRECTABLE_ERROR, ECC_ERROR);
subtype ECC_Code is Ada.Streams.Stream_Element_Array (0 .. 2);
-- Make the 3 bytes ECC code that corresponds to the data array.
procedure Make (Data : in Ada.Streams.Stream_Element_Array;
Code : out ECC_Code) with
Pre => Data'Length = 256 or Data'Length = 512;
-- Check and correct the data array according to the expected ECC codes and current codes.
-- At most one bit can be fixed and two error bits can be detected.
function Correct (Data : in out Ada.Streams.Stream_Element_Array;
Expect_Code : in ECC_Code;
Current_Code : in ECC_Code) return ECC_Result with
Pre => Data'Length = 256 or Data'Length = 512;
-- Check and correct the data array according to the expected ECC codes and current codes.
-- At most one bit can be fixed and two error bits can be detected.
function Correct (Data : in out Ada.Streams.Stream_Element_Array;
Expect_Code : in ECC_Code) return ECC_Result with
Pre => Data'Length = 256 or Data'Length = 512;
end Util.Encoders.ECC;
|
apple-oss-distributions/old_ncurses | Ada | 7,650 | adb | ------------------------------------------------------------------------------
-- --
-- GNAT ncurses Binding Samples --
-- --
-- ncurses --
-- --
-- B O D Y --
-- --
------------------------------------------------------------------------------
-- Copyright (c) 2000 Free Software Foundation, Inc. --
-- --
-- Permission is hereby granted, free of charge, to any person obtaining a --
-- copy of this software and associated documentation files (the --
-- "Software"), to deal in the Software without restriction, including --
-- without limitation the rights to use, copy, modify, merge, publish, --
-- distribute, distribute with modifications, sublicense, and/or sell --
-- copies of the Software, and to permit persons to whom the Software is --
-- furnished to do so, subject to the following conditions: --
-- --
-- The above copyright notice and this permission notice shall be included --
-- in all copies or substantial portions of the Software. --
-- --
-- THE SOFTWARE IS PROVIDED "AS IS", WITHOUT WARRANTY OF ANY KIND, EXPRESS --
-- OR IMPLIED, INCLUDING BUT NOT LIMITED TO THE WARRANTIES OF --
-- MERCHANTABILITY, FITNESS FOR A PARTICULAR PURPOSE AND NONINFRINGEMENT. --
-- IN NO EVENT SHALL THE ABOVE COPYRIGHT HOLDERS BE LIABLE FOR ANY CLAIM, --
-- DAMAGES OR OTHER LIABILITY, WHETHER IN AN ACTION OF CONTRACT, TORT OR --
-- OTHERWISE, ARISING FROM, OUT OF OR IN CONNECTION WITH THE SOFTWARE OR --
-- THE USE OR OTHER DEALINGS IN THE SOFTWARE. --
-- --
-- Except as contained in this notice, the name(s) of the above copyright --
-- holders shall not be used in advertising or otherwise to promote the --
-- sale, use or other dealings in this Software without prior written --
-- authorization. --
------------------------------------------------------------------------------
-- Author: Eugene V. Melaragno <[email protected]> 2000
-- Version Control
-- $Revision: 1.1.1.1 $
-- Binding Version 01.00
------------------------------------------------------------------------------
with ncurses2.util; use ncurses2.util;
with Terminal_Interface.Curses; use Terminal_Interface.Curses;
with Ada.Strings.Unbounded;
with Interfaces.C;
with Terminal_Interface.Curses.Aux;
procedure ncurses2.slk_test is
procedure myGet (Win : in Window := Standard_Window;
Str : out Ada.Strings.Unbounded.Unbounded_String;
Len : in Integer := -1);
procedure myGet (Win : in Window := Standard_Window;
Str : out Ada.Strings.Unbounded.Unbounded_String;
Len : in Integer := -1)
is
use Ada.Strings.Unbounded;
use Interfaces.C;
use Terminal_Interface.Curses.Aux;
function Wgetnstr (Win : Window;
Str : char_array;
Len : int) return int;
pragma Import (C, Wgetnstr, "wgetnstr");
Txt : char_array (0 .. 10);
begin
Txt (0) := Interfaces.C.char'First;
if Wgetnstr (Win, Txt, 8) = Curses_Err then
raise Curses_Exception;
end if;
Str := To_Unbounded_String (To_Ada (Txt, True));
end myGet;
use Int_IO;
use Ada.Strings.Unbounded;
c : Key_Code;
buf : Unbounded_String;
c2 : Character;
fmt : Label_Justification := Centered;
tmp : Integer;
begin
c := CTRL ('l');
loop
Move_Cursor (Line => 0, Column => 0);
c2 := Code_To_Char (c);
case c2 is
when Character'Val (Character'Pos ('l') mod 16#20#) => -- CTRL('l')
Erase;
Switch_Character_Attribute (Attr => (Bold_Character => True,
others => False));
Add (Line => 0, Column => 20,
Str => "Soft Key Exerciser");
Switch_Character_Attribute (On => False,
Attr => (Bold_Character => True,
others => False));
Move_Cursor (Line => 2, Column => 0);
P ("Available commands are:");
P ("");
P ("^L -- refresh screen");
P ("a -- activate or restore soft keys");
P ("d -- disable soft keys");
P ("c -- set centered format for labels");
P ("l -- set left-justified format for labels");
P ("r -- set right-justified format for labels");
P ("[12345678] -- set label; labels are numbered 1 through 8");
P ("e -- erase stdscr (should not erase labels)");
P ("s -- test scrolling of shortened screen");
P ("x, q -- return to main menu");
P ("");
P ("Note: if activating the soft keys causes your terminal to");
P ("scroll up one line, your terminal auto-scrolls when anything");
P ("is written to the last screen position. The ncurses code");
P ("does not yet handle this gracefully.");
Refresh;
Restore_Soft_Label_Keys;
when 'a' =>
Restore_Soft_Label_Keys;
when 'e' =>
Clear;
when 's' =>
Add (Line => 20, Column => 0,
Str => "Press Q to stop the scrolling-test: ");
loop
c := Getchar;
c2 := Code_To_Char (c);
exit when c2 = 'Q';
-- c = ERR?
-- TODO when c is not a character (arrow key)
-- the behavior is different from the C version.
Add (Ch => c2);
end loop;
when 'd' =>
Clear_Soft_Label_Keys;
when 'l' =>
fmt := Left;
when 'c' =>
fmt := Centered;
when 'r' =>
fmt := Right;
when '1' | '2' | '3' | '4' | '5' | '6' | '7' | '8' =>
Add (Line => 20, Column => 0,
Str => "Please enter the label value: ");
Set_Echo_Mode (SwitchOn => True);
myGet (Str => buf);
Set_Echo_Mode (SwitchOn => False);
tmp := ctoi (c2);
Set_Soft_Label_Key (Label_Number (tmp), To_String (buf), fmt);
Refresh_Soft_Label_Keys;
Move_Cursor (Line => 20, Column => 0);
Clear_To_End_Of_Line;
when 'x' | 'q' =>
exit;
-- the C version needed a goto, ha ha
-- breaks exit the case not the loop because fall-throuh
-- happens in C!
when others =>
Beep;
end case;
c := Getchar;
-- TODO exit when c = EOF
end loop;
Erase;
End_Windows;
end ncurses2.slk_test;
|
persan/advent-of-code-2020 | Ada | 135 | adb | with Ada.Text_IO; use Ada.Text_IO;
procedure Adventofcode.Day_10.Main is
begin
Put_Line ("Day-10");
end Adventofcode.Day_10.Main;
|
Heziode/lsystem-editor | Ada | 3,075 | ads | -------------------------------------------------------------------------------
-- LSE -- L-System Editor
-- Author: Heziode
--
-- License:
-- MIT License
--
-- Copyright (c) 2018 Quentin Dauprat (Heziode) <[email protected]>
--
-- Permission is hereby granted, free of charge, to any person obtaining a
-- copy of this software and associated documentation files (the "Software"),
-- to deal in the Software without restriction, including without limitation
-- the rights to use, copy, modify, merge, publish, distribute, sublicense,
-- and/or sell copies of the Software, and to permit persons to whom the
-- Software is furnished to do so, subject to the following conditions:
--
-- The above copyright notice and this permission notice shall be included in
-- all copies or substantial portions of the Software.
--
-- THE SOFTWARE IS PROVIDED "AS IS", WITHOUT WARRANTY OF ANY KIND, EXPRESS OR
-- IMPLIED, INCLUDING BUT NOT LIMITED TO THE WARRANTIES OF MERCHANTABILITY,
-- FITNESS FOR A PARTICULAR PURPOSE AND NONINFRINGEMENT. IN NO EVENT SHALL THE
-- AUTHORS OR COPYRIGHT HOLDERS BE LIABLE FOR ANY CLAIM, DAMAGES OR OTHER
-- LIABILITY, WHETHER IN AN ACTION OF CONTRACT, TORT OR OTHERWISE, ARISING
-- FROM, OUT OF OR IN CONNECTION WITH THE SOFTWARE OR THE USE OR OTHER
-- DEALINGS IN THE SOFTWARE.
-------------------------------------------------------------------------------
with Ada.Strings.Unbounded;
with Ada.Text_IO;
with LSE.Model.IO.Drawing_Area;
with LSE.Model.IO.Turtle;
with LSE.Utils.Coordinate_2D;
use Ada.Strings.Unbounded;
use Ada.Text_IO;
use LSE.Model.IO.Drawing_Area;
use LSE.Model.IO.Turtle;
-- @description
-- Represent a LOGO Turtle on PostScript medium
--
package LSE.Model.IO.Drawing_Area.PostScript is
-- Representing a LOGO Turtle for PostScript medium
type Instance is new Services with private;
-- Constructor
-- @File_Path Location where save the representation
function Initialize (File_Path : String)
return Instance;
overriding
procedure Configure (This : in out Instance;
Turtle : LSE.Model.IO.Turtle.Instance);
overriding
procedure Draw (This : in out Instance);
overriding
procedure Forward (This : in out Instance;
Coordinate : LSE.Utils.Coordinate_2D.Coordinate;
Trace : Boolean := False);
overriding
procedure Rotate_Clockwise (This : in out Instance);
overriding
procedure Rotate_Anticlockwise (This : in out Instance);
overriding
procedure UTurn (This : in out Instance);
overriding
procedure Position_Save (This : in out Instance);
overriding
procedure Position_Restore (This : in out Instance;
X, Y : Fixed_Point);
private
type Instance is new Services with record
-- Location to save the representation
File_Path : Unbounded_String;
-- File pointer
File : access File_Type := new File_Type;
end record;
end LSE.Model.IO.Drawing_Area.PostScript;
|
reznikmm/matreshka | Ada | 9,552 | ads | ------------------------------------------------------------------------------
-- --
-- Matreshka Project --
-- --
-- Ada Modeling Framework --
-- --
-- Runtime Library Component --
-- --
------------------------------------------------------------------------------
-- --
-- Copyright © 2011-2012, Vadim Godunko <[email protected]> --
-- All rights reserved. --
-- --
-- Redistribution and use in source and binary forms, with or without --
-- modification, are permitted provided that the following conditions --
-- are met: --
-- --
-- * Redistributions of source code must retain the above copyright --
-- notice, this list of conditions and the following disclaimer. --
-- --
-- * Redistributions in binary form must reproduce the above copyright --
-- notice, this list of conditions and the following disclaimer in the --
-- documentation and/or other materials provided with the distribution. --
-- --
-- * Neither the name of the Vadim Godunko, IE nor the names of its --
-- contributors may be used to endorse or promote products derived from --
-- this software without specific prior written permission. --
-- --
-- THIS SOFTWARE IS PROVIDED BY THE COPYRIGHT HOLDERS AND CONTRIBUTORS --
-- "AS IS" AND ANY EXPRESS OR IMPLIED WARRANTIES, INCLUDING, BUT NOT --
-- LIMITED TO, THE IMPLIED WARRANTIES OF MERCHANTABILITY AND FITNESS FOR --
-- A PARTICULAR PURPOSE ARE DISCLAIMED. IN NO EVENT SHALL THE COPYRIGHT --
-- HOLDER OR CONTRIBUTORS BE LIABLE FOR ANY DIRECT, INDIRECT, INCIDENTAL, --
-- SPECIAL, EXEMPLARY, OR CONSEQUENTIAL DAMAGES (INCLUDING, BUT NOT LIMITED --
-- TO, PROCUREMENT OF SUBSTITUTE GOODS OR SERVICES; LOSS OF USE, DATA, OR --
-- PROFITS; OR BUSINESS INTERRUPTION) HOWEVER CAUSED AND ON ANY THEORY OF --
-- LIABILITY, WHETHER IN CONTRACT, STRICT LIABILITY, OR TORT (INCLUDING --
-- NEGLIGENCE OR OTHERWISE) ARISING IN ANY WAY OUT OF THE USE OF THIS --
-- SOFTWARE, EVEN IF ADVISED OF THE POSSIBILITY OF SUCH DAMAGE. --
-- --
------------------------------------------------------------------------------
-- $Revision$ $Date$
------------------------------------------------------------------------------
-- This file is generated, don't edit it.
------------------------------------------------------------------------------
-- A namespace is an element in a model that contains a set of named elements
-- that can be identified by name.
------------------------------------------------------------------------------
with AMF.String_Collections;
limited with AMF.UML.Constraints.Collections;
limited with AMF.UML.Element_Imports.Collections;
with AMF.UML.Named_Elements;
limited with AMF.UML.Named_Elements.Collections;
limited with AMF.UML.Package_Imports.Collections;
limited with AMF.UML.Packageable_Elements.Collections;
package AMF.UML.Namespaces is
pragma Preelaborate;
type UML_Namespace is limited interface
and AMF.UML.Named_Elements.UML_Named_Element;
type UML_Namespace_Access is
access all UML_Namespace'Class;
for UML_Namespace_Access'Storage_Size use 0;
not overriding function Get_Element_Import
(Self : not null access constant UML_Namespace)
return AMF.UML.Element_Imports.Collections.Set_Of_UML_Element_Import is abstract;
-- Getter of Namespace::elementImport.
--
-- References the ElementImports owned by the Namespace.
not overriding function Get_Imported_Member
(Self : not null access constant UML_Namespace)
return AMF.UML.Packageable_Elements.Collections.Set_Of_UML_Packageable_Element is abstract;
-- Getter of Namespace::importedMember.
--
-- References the PackageableElements that are members of this Namespace
-- as a result of either PackageImports or ElementImports.
not overriding function Get_Member
(Self : not null access constant UML_Namespace)
return AMF.UML.Named_Elements.Collections.Set_Of_UML_Named_Element is abstract;
-- Getter of Namespace::member.
--
-- A collection of NamedElements identifiable within the Namespace, either
-- by being owned or by being introduced by importing or inheritance.
not overriding function Get_Owned_Member
(Self : not null access constant UML_Namespace)
return AMF.UML.Named_Elements.Collections.Set_Of_UML_Named_Element is abstract;
-- Getter of Namespace::ownedMember.
--
-- A collection of NamedElements owned by the Namespace.
not overriding function Get_Owned_Rule
(Self : not null access constant UML_Namespace)
return AMF.UML.Constraints.Collections.Set_Of_UML_Constraint is abstract;
-- Getter of Namespace::ownedRule.
--
-- Specifies a set of Constraints owned by this Namespace.
not overriding function Get_Package_Import
(Self : not null access constant UML_Namespace)
return AMF.UML.Package_Imports.Collections.Set_Of_UML_Package_Import is abstract;
-- Getter of Namespace::packageImport.
--
-- References the PackageImports owned by the Namespace.
not overriding function Exclude_Collisions
(Self : not null access constant UML_Namespace;
Imps : AMF.UML.Packageable_Elements.Collections.Set_Of_UML_Packageable_Element)
return AMF.UML.Packageable_Elements.Collections.Set_Of_UML_Packageable_Element is abstract;
-- Operation Namespace::excludeCollisions.
--
-- The query excludeCollisions() excludes from a set of
-- PackageableElements any that would not be distinguishable from each
-- other in this namespace.
not overriding function Get_Names_Of_Member
(Self : not null access constant UML_Namespace;
Element : AMF.UML.Named_Elements.UML_Named_Element_Access)
return AMF.String_Collections.Set_Of_String is abstract;
-- Operation Namespace::getNamesOfMember.
--
-- The query getNamesOfMember() takes importing into account. It gives
-- back the set of names that an element would have in an importing
-- namespace, either because it is owned, or if not owned then imported
-- individually, or if not individually then from a package.
-- The query getNamesOfMember() gives a set of all of the names that a
-- member would have in a Namespace. In general a member can have multiple
-- names in a Namespace if it is imported more than once with different
-- aliases. The query takes account of importing. It gives back the set of
-- names that an element would have in an importing namespace, either
-- because it is owned, or if not owned then imported individually, or if
-- not individually then from a package.
not overriding function Import_Members
(Self : not null access constant UML_Namespace;
Imps : AMF.UML.Packageable_Elements.Collections.Set_Of_UML_Packageable_Element)
return AMF.UML.Packageable_Elements.Collections.Set_Of_UML_Packageable_Element is abstract;
-- Operation Namespace::importMembers.
--
-- The query importMembers() defines which of a set of PackageableElements
-- are actually imported into the namespace. This excludes hidden ones,
-- i.e., those which have names that conflict with names of owned members,
-- and also excludes elements which would have the same name when imported.
not overriding function Imported_Member
(Self : not null access constant UML_Namespace)
return AMF.UML.Packageable_Elements.Collections.Set_Of_UML_Packageable_Element is abstract;
-- Operation Namespace::importedMember.
--
-- The importedMember property is derived from the ElementImports and the
-- PackageImports. References the PackageableElements that are members of
-- this Namespace as a result of either PackageImports or ElementImports.
not overriding function Members_Are_Distinguishable
(Self : not null access constant UML_Namespace)
return Boolean is abstract;
-- Operation Namespace::membersAreDistinguishable.
--
-- The Boolean query membersAreDistinguishable() determines whether all of
-- the namespace's members are distinguishable within it.
not overriding function Owned_Member
(Self : not null access constant UML_Namespace)
return AMF.UML.Named_Elements.Collections.Set_Of_UML_Named_Element is abstract;
-- Operation Namespace::ownedMember.
--
-- Missing derivation for Namespace::/ownedMember : NamedElement
end AMF.UML.Namespaces;
|
reznikmm/matreshka | Ada | 4,953 | ads | ------------------------------------------------------------------------------
-- --
-- Matreshka Project --
-- --
-- Localization, Internationalization, Globalization for Ada --
-- --
-- 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$
------------------------------------------------------------------------------
-- UTF-8 encoder and decoder.
--
-- Note: this package is not private child of Text_Codecs because it is used
-- in League.Strings directly.
------------------------------------------------------------------------------
private with Matreshka.Internals.Unicode;
package Matreshka.Internals.Text_Codecs.UTF8 is
pragma Preelaborate;
------------------
-- UTF8_Decoder --
------------------
type UTF8_Decoder is new Abstract_Decoder with private;
overriding function Is_Error (Self : UTF8_Decoder) return Boolean;
overriding function Is_Mailformed
(Self : UTF8_Decoder) return Boolean;
overriding procedure Decode_Append
(Self : in out UTF8_Decoder;
Data : Ada.Streams.Stream_Element_Array;
String : in out Matreshka.Internals.Strings.Shared_String_Access);
function Decoder (Mode : Decoder_Mode) return Abstract_Decoder'Class;
------------------
-- UTF8_Encoder --
------------------
type UTF8_Encoder is new Abstract_Encoder with private;
overriding procedure Encode
(Self : in out UTF8_Encoder;
String : not null Matreshka.Internals.Strings.Shared_String_Access;
Buffer : out MISEV.Shared_Stream_Element_Vector_Access);
function Encoder return Abstract_Encoder'Class;
private
type UTF8_State is mod 2 ** 8;
type UTF8_Decoder is new Abstract_Decoder with record
State : UTF8_State := 0;
Code : Matreshka.Internals.Unicode.Code_Unit_32 := 0;
end record;
type UTF8_Encoder is new Abstract_Encoder with null record;
end Matreshka.Internals.Text_Codecs.UTF8;
|
onox/orka | Ada | 9,479 | adb | -- SPDX-License-Identifier: Apache-2.0
--
-- Copyright (c) 2018 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 body Orka.Simulation_Jobs is
type Fixed_Update_Job is new Jobs.Abstract_Parallel_Job with record
Scene : not null Behaviors.Behavior_Array_Access;
Time_Step : Time_Span;
Count : Natural;
end record;
type Update_Job is new Jobs.Abstract_Parallel_Job with record
Scene : not null Behaviors.Behavior_Array_Access;
Time_Step : Time_Span;
end record;
type After_Update_Job is new Jobs.Abstract_Parallel_Job with record
Scene : not null Behaviors.Behavior_Array_Access;
Time_Step : Time_Span;
View_Position : Behaviors.Vector4;
end record;
type Finished_Fixed_Update_Job is new Jobs.Abstract_Job with record
Scene : not null Behaviors.Behavior_Array_Access;
Time_Step : Time_Span;
View_Position : Behaviors.Vector4;
Batch_Length : Positive;
end record;
overriding
procedure Execute
(Object : Fixed_Update_Job;
Context : Jobs.Execution_Context'Class;
From, To : Positive);
overriding
procedure Execute
(Object : Update_Job;
Context : Jobs.Execution_Context'Class;
From, To : Positive);
overriding
procedure Execute
(Object : After_Update_Job;
Context : Jobs.Execution_Context'Class;
From, To : Positive);
overriding
procedure Execute
(Object : Finished_Fixed_Update_Job;
Context : Jobs.Execution_Context'Class);
-----------------------------------------------------------------------------
type Start_Render_Job is new Jobs.Abstract_Job and Jobs.GPU_Job with record
Fence : not null access Fences.Buffer_Fence;
end record;
type Scene_Render_Job is new Jobs.Abstract_Job and Jobs.GPU_Job with record
Render : Simulation.Render_Ptr;
Scene : Behaviors.Behavior_Array_Access;
Camera : Cameras.Camera_Ptr;
end record;
type Finish_Render_Job is new Jobs.Abstract_Job and Jobs.GPU_Job with record
Fence : not null access Fences.Buffer_Fence;
end record;
overriding
procedure Execute
(Object : Start_Render_Job;
Context : Jobs.Execution_Context'Class);
overriding
procedure Execute
(Object : Scene_Render_Job;
Context : Jobs.Execution_Context'Class);
overriding
procedure Execute
(Object : Finish_Render_Job;
Context : Jobs.Execution_Context'Class);
-----------------------------------------------------------------------------
-- CONSTRUCTORS --
-----------------------------------------------------------------------------
function Create_Fixed_Update_Job
(Scene : not null Behaviors.Behavior_Array_Access;
Time_Step : Time_Span;
Count : Natural) return Jobs.Parallel_Job_Ptr
is (new Fixed_Update_Job'
(Jobs.Abstract_Parallel_Job with
Scene => Scene, Time_Step => Time_Step, Count => Count));
function Create_Update_Job
(Scene : not null Behaviors.Behavior_Array_Access;
Time_Step : Time_Span) return Jobs.Parallel_Job_Ptr
is (new Update_Job'
(Jobs.Abstract_Parallel_Job with Scene => Scene, Time_Step => Time_Step));
function Create_After_Update_Job
(Scene : not null Behaviors.Behavior_Array_Access;
Time_Step : Time_Span;
Position : Behaviors.Vector4) return Jobs.Parallel_Job_Ptr
is (new After_Update_Job'
(Jobs.Abstract_Parallel_Job with
Scene => Scene, Time_Step => Time_Step, View_Position => Position));
function Create_Finished_Job
(Scene : not null Behaviors.Behavior_Array_Access;
Time_Step : Time_Span;
Position : Behaviors.Vector4;
Batch_Length : Positive) return Jobs.Job_Ptr
is (new Finished_Fixed_Update_Job'
(Jobs.Abstract_Job with
Scene => Scene, Time_Step => Time_Step, View_Position => Position,
Batch_Length => Batch_Length));
-----------------------------------------------------------------------------
-- CONSTRUCTORS --
-----------------------------------------------------------------------------
function Create_Start_Render_Job
(Fence : not null access Fences.Buffer_Fence) return Jobs.Job_Ptr
is (new Start_Render_Job'(Jobs.Abstract_Job with Fence => Fence));
function Create_Scene_Render_Job
(Render : Simulation.Render_Ptr;
Scene : not null Behaviors.Behavior_Array_Access;
Camera : Cameras.Camera_Ptr) return Jobs.Job_Ptr
is (new Scene_Render_Job'(Jobs.Abstract_Job with
Render => Render, Scene => Scene, Camera => Camera));
function Create_Finish_Render_Job
(Fence : not null access Fences.Buffer_Fence) return Jobs.Job_Ptr
is (new Finish_Render_Job'(Jobs.Abstract_Job with Fence => Fence));
-----------------------------------------------------------------------------
-- EXECUTE PROCEDURES --
-----------------------------------------------------------------------------
overriding
procedure Execute
(Object : Fixed_Update_Job;
Context : Jobs.Execution_Context'Class;
From, To : Positive)
is
DT : constant Duration := To_Duration (Object.Time_Step);
begin
for Behavior of Object.Scene (From .. To) loop
for Iteration in 1 .. Object.Count loop
Behavior.Fixed_Update (DT);
end loop;
end loop;
end Execute;
overriding
procedure Execute
(Object : Update_Job;
Context : Jobs.Execution_Context'Class;
From, To : Positive)
is
DT : constant Duration := To_Duration (Object.Time_Step);
begin
for Behavior of Object.Scene (From .. To) loop
Behavior.Update (DT);
end loop;
end Execute;
overriding
procedure Execute
(Object : After_Update_Job;
Context : Jobs.Execution_Context'Class;
From, To : Positive)
is
DT : constant Duration := To_Duration (Object.Time_Step);
begin
for Behavior of Object.Scene (From .. To) loop
Behavior.After_Update (DT, Object.View_Position);
end loop;
end Execute;
function Clone_Update_Job
(Job : Jobs.Parallel_Job_Ptr;
Length : Positive) return Jobs.Dependency_Array
is
Object : constant Update_Job := Update_Job (Job.all);
begin
return Result : constant Jobs.Dependency_Array (1 .. Length)
:= (others => new Update_Job'(Object));
end Clone_Update_Job;
function Clone_After_Update_Job
(Job : Jobs.Parallel_Job_Ptr;
Length : Positive) return Jobs.Dependency_Array
is
Object : constant After_Update_Job := After_Update_Job (Job.all);
begin
return Result : constant Jobs.Dependency_Array (1 .. Length)
:= (others => new After_Update_Job'(Object));
end Clone_After_Update_Job;
function Clone_Fixed_Update_Job
(Job : Jobs.Parallel_Job_Ptr;
Length : Positive) return Jobs.Dependency_Array
is
Object : constant Fixed_Update_Job := Fixed_Update_Job (Job.all);
begin
return Result : constant Jobs.Dependency_Array (1 .. Length)
:= (others => new Fixed_Update_Job'(Object));
end Clone_Fixed_Update_Job;
overriding
procedure Execute
(Object : Finished_Fixed_Update_Job;
Context : Jobs.Execution_Context'Class)
is
Update_Job : constant Jobs.Job_Ptr :=
Jobs.Parallelize (Create_Update_Job (Object.Scene, Object.Time_Step),
Clone_Update_Job'Access, Object.Scene'Length, Object.Batch_Length);
After_Update_Job : constant Jobs.Job_Ptr :=
Jobs.Parallelize (Create_After_Update_Job
(Object.Scene, Object.Time_Step, Object.View_Position),
Clone_After_Update_Job'Access, Object.Scene'Length, Object.Batch_Length);
begin
After_Update_Job.Set_Dependency (Update_Job);
Context.Enqueue (Update_Job);
end Execute;
-----------------------------------------------------------------------------
-- EXECUTE PROCEDURES --
-----------------------------------------------------------------------------
overriding
procedure Execute
(Object : Start_Render_Job;
Context : Jobs.Execution_Context'Class)
is
Status : Fences.Fence_Status;
begin
Object.Fence.Prepare_Index (Status);
end Execute;
overriding
procedure Execute
(Object : Scene_Render_Job;
Context : Jobs.Execution_Context'Class) is
begin
Object.Render (Object.Scene, Object.Camera);
end Execute;
overriding
procedure Execute
(Object : Finish_Render_Job;
Context : Jobs.Execution_Context'Class) is
begin
Object.Fence.Advance_Index;
end Execute;
end Orka.Simulation_Jobs;
|
persan/testlibadalang | Ada | 2,233 | ads | ------------------------------------------------------------------------------
-- --
-- GNATPP COMPONENTS --
-- --
-- Stub --
-- --
-- S p e c --
-- --
-- Copyright (C) 2001-2017, AdaCore --
-- --
-- GNATPP 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. GNATCHECK is distributed in the hope that it will be useful, --
-- but WITHOUT ANY WARRANTY; without even the implied warranty of --
-- MERCHANTABILITY or FITNESS FOR A PARTICULAR PURPOSE. See the GNU General --
-- Public License for more details. You should have received a copy of the --
-- GNU General Public License distributed with GNAT; see file COPYING3. If --
-- not, go to http://www.gnu.org/licenses for a complete copy of the --
-- license. --
-- --
-- GNATPP is maintained by AdaCore (http://www.adacore.com) --
-- --
------------------------------------------------------------------------------
pragma Warnings (Off); -- imported for children
with Ada.Wide_Characters.Handling; use Ada.Wide_Characters.Handling;
use Ada;
with Utils_Debug;
with Utils.Dbg_Out; use Utils;
with Utils.String_Utilities; use Utils.String_Utilities;
with Utils; use Utils;
pragma Warnings (On);
package JSON_Gen is
-- Root of JSON_Gen
end JSON_Gen;
|
zhmu/ananas | Ada | 22,126 | adb | ------------------------------------------------------------------------------
-- --
-- GNAT RUN-TIME COMPONENTS --
-- --
-- G N A T . C A L E N D A R --
-- --
-- B o d y --
-- --
-- Copyright (C) 1999-2022, AdaCore --
-- --
-- GNAT is free software; you can redistribute it and/or modify it under --
-- terms of the GNU General Public License as published by the Free Soft- --
-- ware Foundation; either version 3, or (at your option) any later ver- --
-- sion. GNAT is distributed in the hope that it will be useful, but WITH- --
-- OUT ANY WARRANTY; without even the implied warranty of MERCHANTABILITY --
-- or FITNESS FOR A PARTICULAR PURPOSE. --
-- --
-- As a special exception under Section 7 of GPL version 3, you are granted --
-- additional permissions described in the GCC Runtime Library Exception, --
-- version 3.1, as published by the Free Software Foundation. --
-- --
-- You should have received a copy of the GNU General Public License and --
-- a copy of the GCC Runtime Library Exception along with this program; --
-- see the files COPYING3 and COPYING.RUNTIME respectively. If not, see --
-- <http://www.gnu.org/licenses/>. --
-- --
-- GNAT was originally developed by the GNAT team at New York University. --
-- Extensive contributions were provided by Ada Core Technologies Inc. --
-- --
------------------------------------------------------------------------------
with Interfaces.C.Extensions;
package body GNAT.Calendar is
use Ada.Calendar;
use Interfaces;
-----------------
-- Day_In_Year --
-----------------
function Day_In_Year (Date : Time) return Day_In_Year_Number is
Year : Year_Number;
Month : Month_Number;
Day : Day_Number;
Day_Secs : Day_Duration;
begin
Split (Date, Year, Month, Day, Day_Secs);
return Julian_Day (Year, Month, Day) - Julian_Day (Year, 1, 1) + 1;
end Day_In_Year;
-----------------
-- Day_Of_Week --
-----------------
function Day_Of_Week (Date : Time) return Day_Name is
Year : Year_Number;
Month : Month_Number;
Day : Day_Number;
Day_Secs : Day_Duration;
begin
Split (Date, Year, Month, Day, Day_Secs);
return Day_Name'Val ((Julian_Day (Year, Month, Day)) mod 7);
end Day_Of_Week;
----------
-- Hour --
----------
function Hour (Date : Time) return Hour_Number is
Year : Year_Number;
Month : Month_Number;
Day : Day_Number;
Hour : Hour_Number;
Minute : Minute_Number;
Second : Second_Number;
Sub_Second : Second_Duration;
begin
Split (Date, Year, Month, Day, Hour, Minute, Second, Sub_Second);
return Hour;
end Hour;
----------------
-- Julian_Day --
----------------
-- Julian_Day is used to by Day_Of_Week and Day_In_Year. Note that this
-- implementation is not expensive.
function Julian_Day
(Year : Year_Number;
Month : Month_Number;
Day : Day_Number) return Integer
is
Internal_Year : Integer;
Internal_Month : Integer;
Internal_Day : Integer;
Julian_Date : Integer;
C : Integer;
Ya : Integer;
begin
Internal_Year := Integer (Year);
Internal_Month := Integer (Month);
Internal_Day := Integer (Day);
if Internal_Month > 2 then
Internal_Month := Internal_Month - 3;
else
Internal_Month := Internal_Month + 9;
Internal_Year := Internal_Year - 1;
end if;
C := Internal_Year / 100;
Ya := Internal_Year - (100 * C);
Julian_Date := (146_097 * C) / 4 +
(1_461 * Ya) / 4 +
(153 * Internal_Month + 2) / 5 +
Internal_Day + 1_721_119;
return Julian_Date;
end Julian_Day;
------------
-- Minute --
------------
function Minute (Date : Time) return Minute_Number is
Year : Year_Number;
Month : Month_Number;
Day : Day_Number;
Hour : Hour_Number;
Minute : Minute_Number;
Second : Second_Number;
Sub_Second : Second_Duration;
begin
Split (Date, Year, Month, Day, Hour, Minute, Second, Sub_Second);
return Minute;
end Minute;
------------
-- Second --
------------
function Second (Date : Time) return Second_Number is
Year : Year_Number;
Month : Month_Number;
Day : Day_Number;
Hour : Hour_Number;
Minute : Minute_Number;
Second : Second_Number;
Sub_Second : Second_Duration;
begin
Split (Date, Year, Month, Day, Hour, Minute, Second, Sub_Second);
return Second;
end Second;
-----------
-- Split --
-----------
procedure Split
(Date : Time;
Year : out Year_Number;
Month : out Month_Number;
Day : out Day_Number;
Hour : out Hour_Number;
Minute : out Minute_Number;
Second : out Second_Number;
Sub_Second : out Second_Duration)
is
Day_Secs : Day_Duration;
Secs : Natural;
begin
Split (Date, Year, Month, Day, Day_Secs);
Secs := (if Day_Secs = 0.0 then 0 else Natural (Day_Secs - 0.5));
Sub_Second := Second_Duration (Day_Secs - Day_Duration (Secs));
Hour := Hour_Number (Secs / 3_600);
Secs := Secs mod 3_600;
Minute := Minute_Number (Secs / 60);
Second := Second_Number (Secs mod 60);
end Split;
---------------------
-- Split_At_Locale --
---------------------
procedure Split_At_Locale
(Date : Time;
Year : out Year_Number;
Month : out Month_Number;
Day : out Day_Number;
Hour : out Hour_Number;
Minute : out Minute_Number;
Second : out Second_Number;
Sub_Second : out Second_Duration)
is
procedure Ada_Calendar_Split
(Date : Time;
Year : out Year_Number;
Month : out Month_Number;
Day : out Day_Number;
Day_Secs : out Day_Duration;
Hour : out Integer;
Minute : out Integer;
Second : out Integer;
Sub_Sec : out Duration;
Leap_Sec : out Boolean;
Use_TZ : Boolean;
Is_Historic : Boolean;
Time_Zone : Long_Integer);
pragma Import (Ada, Ada_Calendar_Split, "__gnat_split");
Ds : Day_Duration;
Le : Boolean;
begin
-- Even though the input time zone is UTC (0), the flag Use_TZ will
-- ensure that Split picks up the local time zone. ???But Use_TZ is
-- False below, and anyway, Use_TZ has no effect if Time_Zone is 0.
Ada_Calendar_Split
(Date => Date,
Year => Year,
Month => Month,
Day => Day,
Day_Secs => Ds,
Hour => Hour,
Minute => Minute,
Second => Second,
Sub_Sec => Sub_Second,
Leap_Sec => Le,
Use_TZ => False,
Is_Historic => False,
Time_Zone => 0);
end Split_At_Locale;
----------------
-- Sub_Second --
----------------
function Sub_Second (Date : Time) return Second_Duration is
Year : Year_Number;
Month : Month_Number;
Day : Day_Number;
Hour : Hour_Number;
Minute : Minute_Number;
Second : Second_Number;
Sub_Second : Second_Duration;
begin
Split (Date, Year, Month, Day, Hour, Minute, Second, Sub_Second);
return Sub_Second;
end Sub_Second;
-------------
-- Time_Of --
-------------
function Time_Of
(Year : Year_Number;
Month : Month_Number;
Day : Day_Number;
Hour : Hour_Number;
Minute : Minute_Number;
Second : Second_Number;
Sub_Second : Second_Duration := 0.0) return Time
is
Day_Secs : constant Day_Duration :=
Day_Duration (Hour * 3_600) +
Day_Duration (Minute * 60) +
Day_Duration (Second) +
Sub_Second;
begin
return Time_Of (Year, Month, Day, Day_Secs);
end Time_Of;
-----------------------
-- Time_Of_At_Locale --
-----------------------
function Time_Of_At_Locale
(Year : Year_Number;
Month : Month_Number;
Day : Day_Number;
Hour : Hour_Number;
Minute : Minute_Number;
Second : Second_Number;
Sub_Second : Second_Duration := 0.0) return Time
is
function Ada_Calendar_Time_Of
(Year : Year_Number;
Month : Month_Number;
Day : Day_Number;
Day_Secs : Day_Duration;
Hour : Integer;
Minute : Integer;
Second : Integer;
Sub_Sec : Duration;
Leap_Sec : Boolean;
Use_Day_Secs : Boolean;
Use_TZ : Boolean;
Is_Historic : Boolean;
Time_Zone : Long_Integer) return Time;
pragma Import (Ada, Ada_Calendar_Time_Of, "__gnat_time_of");
begin
-- Even though the input time zone is UTC (0), the flag Use_TZ will
-- ensure that Split picks up the local time zone. ???But there is no
-- call to Split here.
return
Ada_Calendar_Time_Of
(Year => Year,
Month => Month,
Day => Day,
Day_Secs => 0.0,
Hour => Hour,
Minute => Minute,
Second => Second,
Sub_Sec => Sub_Second,
Leap_Sec => False,
Use_Day_Secs => False,
Use_TZ => False,
Is_Historic => False,
Time_Zone => 0);
end Time_Of_At_Locale;
-----------------
-- To_Duration --
-----------------
function To_Duration (T : not null access timeval) return Duration is
procedure timeval_to_duration
(T : not null access timeval;
sec : not null access C.Extensions.long_long;
usec : not null access C.long);
pragma Import (C, timeval_to_duration, "__gnat_timeval_to_duration");
Micro : constant := 10**6;
sec : aliased C.Extensions.long_long;
usec : aliased C.long;
begin
timeval_to_duration (T, sec'Access, usec'Access);
pragma Annotate (CodePeer, Modified, sec);
pragma Annotate (CodePeer, Modified, usec);
return Duration (sec) + Duration (usec) / Micro;
end To_Duration;
----------------
-- To_Timeval --
----------------
function To_Timeval (D : Duration) return timeval is
procedure duration_to_timeval
(Sec : C.Extensions.long_long;
Usec : C.long;
T : not null access timeval);
pragma Import (C, duration_to_timeval, "__gnat_duration_to_timeval");
Micro : constant := 10**6;
Result : aliased timeval;
sec : C.Extensions.long_long;
usec : C.long;
begin
if D = 0.0 then
sec := 0;
usec := 0;
else
sec := C.Extensions.long_long (D - 0.5);
usec := C.long ((D - Duration (sec)) * Micro - 0.5);
end if;
duration_to_timeval (sec, usec, Result'Access);
return Result;
end To_Timeval;
------------------
-- Week_In_Year --
------------------
function Week_In_Year (Date : Time) return Week_In_Year_Number is
Year : Year_Number;
Week : Week_In_Year_Number;
begin
Year_Week_In_Year (Date, Year, Week);
return Week;
end Week_In_Year;
-----------------------
-- Year_Week_In_Year --
-----------------------
procedure Year_Week_In_Year
(Date : Time;
Year : out Year_Number;
Week : out Week_In_Year_Number)
is
Month : Month_Number;
Day : Day_Number;
Hour : Hour_Number;
Minute : Minute_Number;
Second : Second_Number;
Sub_Second : Second_Duration;
Jan_1 : Day_Name;
Shift : Week_In_Year_Number;
Start_Week : Week_In_Year_Number;
function Is_Leap (Year : Year_Number) return Boolean;
-- Return True if Year denotes a leap year. Leap centennial years are
-- properly handled.
function Jan_1_Day_Of_Week
(Jan_1 : Day_Name;
Year : Year_Number;
Last_Year : Boolean := False;
Next_Year : Boolean := False) return Day_Name;
-- Given the weekday of January 1 in Year, determine the weekday on
-- which January 1 fell last year or will fall next year as set by
-- the two flags. This routine does not call Time_Of or Split.
function Last_Year_Has_53_Weeks
(Jan_1 : Day_Name;
Year : Year_Number) return Boolean;
-- Given the weekday of January 1 in Year, determine whether last year
-- has 53 weeks. A False value implies that the year has 52 weeks.
-------------
-- Is_Leap --
-------------
function Is_Leap (Year : Year_Number) return Boolean is
begin
if Year mod 400 = 0 then
return True;
elsif Year mod 100 = 0 then
return False;
else
return Year mod 4 = 0;
end if;
end Is_Leap;
-----------------------
-- Jan_1_Day_Of_Week --
-----------------------
function Jan_1_Day_Of_Week
(Jan_1 : Day_Name;
Year : Year_Number;
Last_Year : Boolean := False;
Next_Year : Boolean := False) return Day_Name
is
Shift : Integer := 0;
begin
if Last_Year then
Shift := (if Is_Leap (Year - 1) then -2 else -1);
elsif Next_Year then
Shift := (if Is_Leap (Year) then 2 else 1);
end if;
return Day_Name'Val ((Day_Name'Pos (Jan_1) + Shift) mod 7);
end Jan_1_Day_Of_Week;
----------------------------
-- Last_Year_Has_53_Weeks --
----------------------------
function Last_Year_Has_53_Weeks
(Jan_1 : Day_Name;
Year : Year_Number) return Boolean
is
Last_Jan_1 : constant Day_Name :=
Jan_1_Day_Of_Week (Jan_1, Year, Last_Year => True);
begin
-- These two cases are illustrated in the table below
return
Last_Jan_1 = Thursday
or else (Last_Jan_1 = Wednesday and then Is_Leap (Year - 1));
end Last_Year_Has_53_Weeks;
-- Start of processing for Week_In_Year
begin
Split (Date, Year, Month, Day, Hour, Minute, Second, Sub_Second);
-- According to ISO 8601, the first week of year Y is the week that
-- contains the first Thursday in year Y. The following table contains
-- all possible combinations of years and weekdays along with examples.
-- +-------+------+-------+---------+
-- | Jan 1 | Leap | Weeks | Example |
-- +-------+------+-------+---------+
-- | Mon | No | 52 | 2007 |
-- +-------+------+-------+---------+
-- | Mon | Yes | 52 | 1996 |
-- +-------+------+-------+---------+
-- | Tue | No | 52 | 2002 |
-- +-------+------+-------+---------+
-- | Tue | Yes | 52 | 1980 |
-- +-------+------+-------+---------+
-- | Wed | No | 52 | 2003 |
-- +-------+------#########---------+
-- | Wed | Yes # 53 # 1992 |
-- +-------+------#-------#---------+
-- | Thu | No # 53 # 1998 |
-- +-------+------#-------#---------+
-- | Thu | Yes # 53 # 2004 |
-- +-------+------#########---------+
-- | Fri | No | 52 | 1999 |
-- +-------+------+-------+---------+
-- | Fri | Yes | 52 | 1988 |
-- +-------+------+-------+---------+
-- | Sat | No | 52 | 1994 |
-- +-------+------+-------+---------+
-- | Sat | Yes | 52 | 1972 |
-- +-------+------+-------+---------+
-- | Sun | No | 52 | 1995 |
-- +-------+------+-------+---------+
-- | Sun | Yes | 52 | 1956 |
-- +-------+------+-------+---------+
-- A small optimization, the input date is January 1. Note that this
-- is a key day since it determines the number of weeks and is used
-- when special casing the first week of January and the last week of
-- December.
Jan_1 := Day_Of_Week (if Day = 1 and then Month = 1
then Date
else (Time_Of (Year, 1, 1, 0.0)));
-- Special cases for January
if Month = 1 then
-- Special case 1: January 1, 2 and 3. These three days may belong
-- to last year's last week which can be week number 52 or 53.
-- +-----+-----+-----+=====+-----+-----+-----+
-- | Mon | Tue | Wed # Thu # Fri | Sat | Sun |
-- +-----+-----+-----+-----+-----+-----+-----+
-- | 26 | 27 | 28 # 29 # 30 | 31 | 1 |
-- +-----+-----+-----+-----+-----+-----+-----+
-- | 27 | 28 | 29 # 30 # 31 | 1 | 2 |
-- +-----+-----+-----+-----+-----+-----+-----+
-- | 28 | 29 | 30 # 31 # 1 | 2 | 3 |
-- +-----+-----+-----+=====+-----+-----+-----+
if (Day = 1 and then Jan_1 in Friday .. Sunday)
or else
(Day = 2 and then Jan_1 in Friday .. Saturday)
or else
(Day = 3 and then Jan_1 = Friday)
then
Week := (if Last_Year_Has_53_Weeks (Jan_1, Year) then 53 else 52);
-- January 1, 2 and 3 belong to the previous year
Year := Year - 1;
return;
-- Special case 2: January 1, 2, 3, 4, 5, 6 and 7 of the first week
-- +-----+-----+-----+=====+-----+-----+-----+
-- | Mon | Tue | Wed # Thu # Fri | Sat | Sun |
-- +-----+-----+-----+-----+-----+-----+-----+
-- | 29 | 30 | 31 # 1 # 2 | 3 | 4 |
-- +-----+-----+-----+-----+-----+-----+-----+
-- | 30 | 31 | 1 # 2 # 3 | 4 | 5 |
-- +-----+-----+-----+-----+-----+-----+-----+
-- | 31 | 1 | 2 # 3 # 4 | 5 | 6 |
-- +-----+-----+-----+-----+-----+-----+-----+
-- | 1 | 2 | 3 # 4 # 5 | 6 | 7 |
-- +-----+-----+-----+=====+-----+-----+-----+
elsif (Day <= 4 and then Jan_1 in Monday .. Thursday)
or else
(Day = 5 and then Jan_1 in Monday .. Wednesday)
or else
(Day = 6 and then Jan_1 in Monday .. Tuesday)
or else
(Day = 7 and then Jan_1 = Monday)
then
Week := 1;
return;
end if;
-- Month other than 1
-- Special case 3: December 29, 30 and 31. These days may belong to
-- next year's first week.
-- +-----+-----+-----+=====+-----+-----+-----+
-- | Mon | Tue | Wed # Thu # Fri | Sat | Sun |
-- +-----+-----+-----+-----+-----+-----+-----+
-- | 29 | 30 | 31 # 1 # 2 | 3 | 4 |
-- +-----+-----+-----+-----+-----+-----+-----+
-- | 30 | 31 | 1 # 2 # 3 | 4 | 5 |
-- +-----+-----+-----+-----+-----+-----+-----+
-- | 31 | 1 | 2 # 3 # 4 | 5 | 6 |
-- +-----+-----+-----+=====+-----+-----+-----+
elsif Month = 12 and then Day > 28 then
declare
Next_Jan_1 : constant Day_Name :=
Jan_1_Day_Of_Week (Jan_1, Year, Next_Year => True);
begin
if (Day = 29 and then Next_Jan_1 = Thursday)
or else
(Day = 30 and then Next_Jan_1 in Wednesday .. Thursday)
or else
(Day = 31 and then Next_Jan_1 in Tuesday .. Thursday)
then
Year := Year + 1;
Week := 1;
return;
end if;
end;
end if;
-- Determine the week from which to start counting. If January 1 does
-- not belong to the first week of the input year, then the next week
-- is the first week.
Start_Week := (if Jan_1 in Friday .. Sunday then 1 else 2);
-- At this point all special combinations have been accounted for and
-- the proper start week has been found. Since January 1 may not fall
-- on a Monday, shift 7 - Day_Name'Pos (Jan_1). This action ensures an
-- origin which falls on Monday.
Shift := 7 - Day_Name'Pos (Jan_1);
Week := Start_Week + (Day_In_Year (Date) - Shift - 1) / 7;
end Year_Week_In_Year;
end GNAT.Calendar;
|
sungyeon/drake | Ada | 3,032 | ads | pragma License (Unrestricted);
-- Ada 2012
with Ada.Characters.Handling;
private with Ada.UCD;
package Ada.Wide_Wide_Characters.Handling is
-- pragma Pure;
pragma Preelaborate;
-- function Character_Set_Version return String;
Character_Set_Version : constant String;
function Is_Control (Item : Wide_Wide_Character) return Boolean
renames Characters.Handling.Overloaded_Is_Control;
function Is_Letter (Item : Wide_Wide_Character) return Boolean
renames Characters.Handling.Overloaded_Is_Letter;
function Is_Lower (Item : Wide_Wide_Character) return Boolean
renames Characters.Handling.Overloaded_Is_Lower;
function Is_Upper (Item : Wide_Wide_Character) return Boolean
renames Characters.Handling.Overloaded_Is_Upper;
function Is_Basic (Item : Wide_Wide_Character) return Boolean
renames Characters.Handling.Overloaded_Is_Basic;
-- Note: Wide_Wide_Characters.Handling.Is_Basic is incompatible with
-- Characters.Handling.Is_Basic. See AI12-0260-1.
function Is_Digit (Item : Wide_Wide_Character) return Boolean
renames Characters.Handling.Overloaded_Is_Digit;
function Is_Decimal_Digit (Item : Wide_Wide_Character) return Boolean
renames Is_Digit;
function Is_Hexadecimal_Digit (Item : Wide_Wide_Character) return Boolean
renames Characters.Handling.Overloaded_Is_Hexadecimal_Digit;
function Is_Alphanumeric (Item : Wide_Wide_Character) return Boolean
renames Characters.Handling.Overloaded_Is_Alphanumeric;
function Is_Special (Item : Wide_Wide_Character) return Boolean
renames Characters.Handling.Overloaded_Is_Special;
-- function Is_Line_Terminator (Item : Wide_Wide_Character) return Boolean;
-- function Is_Mark (Item : Wide_Wide_Character) return Boolean;
-- function Is_Other_Format (Item : Wide_Wide_Character) return Boolean;
-- function Is_Punctuation_Connector (Item : Wide_Wide_Character)
-- return Boolean;
-- function Is_Space (Item : Wide_Wide_Character) return Boolean;
function Is_Graphic (Item : Wide_Wide_Character) return Boolean
renames Characters.Handling.Overloaded_Is_Graphic;
function To_Basic (Item : Wide_Wide_Character) return Wide_Wide_Character
renames Characters.Handling.Overloaded_To_Basic;
function To_Lower (Item : Wide_Wide_Character) return Wide_Wide_Character
renames Characters.Handling.Overloaded_To_Lower;
function To_Upper (Item : Wide_Wide_Character) return Wide_Wide_Character
renames Characters.Handling.Overloaded_To_Upper;
function To_Lower (Item : Wide_Wide_String) return Wide_Wide_String
renames Characters.Handling.Overloaded_To_Lower;
function To_Upper (Item : Wide_Wide_String) return Wide_Wide_String
renames Characters.Handling.Overloaded_To_Upper;
function To_Basic (Item : Wide_Wide_String) return Wide_Wide_String
renames Characters.Handling.Overloaded_To_Basic;
private
Character_Set_Version : constant String := UCD.Version;
end Ada.Wide_Wide_Characters.Handling;
|
sungyeon/drake | Ada | 481 | ads | pragma License (Unrestricted);
-- implementation unit required by compiler
with System.Exponentiations;
with System.Unsigned_Types;
package System.Exp_LLU is
pragma Pure;
-- required for "**" by compiler (s-expllu.ads)
-- Modular types do not raise the exceptions.
function Exp_Long_Long_Unsigned is
new Exponentiations.Generic_Exp_Unsigned (
Unsigned_Types.Long_Long_Unsigned,
Shift_Left => Unsigned_Types.Shift_Left);
end System.Exp_LLU;
|
zhmu/ananas | Ada | 360 | ads | package Dflt_Init_Cond_Pkg is
type Explicit is limited private with Default_Initial_Condition => True;
type Implicit is limited private with Default_Initial_Condition;
procedure Read (Obj : Explicit);
procedure Read (Obj : Implicit);
private
type Implicit is access all Integer;
type Explicit is access all Integer;
end Dflt_Init_Cond_Pkg;
|
onox/orka | Ada | 3,406 | adb | -- SPDX-License-Identifier: Apache-2.0
--
-- Copyright (c) 2017 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 Ada.Unchecked_Deallocation;
with GL.API;
with GL.Debug_Types;
with GL.Enums.Getter;
package body GL.Debug.Logs is
function Message_Log return Message_Array is
use GL.Debug_Types;
Length : Size := 0;
Number_Messages : constant Size := Logged_Messages;
Log_Length : constant Size := Number_Messages * Max_Message_Length;
Sources : Source_Array_Access := new Source_Array (1 .. Number_Messages);
Types : Type_Array_Access := new Type_Array (1 .. Number_Messages);
Levels : Severity_Array_Access := new Severity_Array (1 .. Number_Messages);
IDs : UInt_Array_Access := new Orka.Unsigned_32_Array (1 .. Number_Messages);
Lengths : Size_Array_Access := new Size_Array (1 .. Number_Messages);
Log : Debug_Types.String_Access := new String'(1 .. Natural (Log_Length) => ' ');
procedure Free is new Ada.Unchecked_Deallocation
(Object => String, Name => Debug_Types.String_Access);
procedure Free is new Ada.Unchecked_Deallocation
(Object => Source_Array, Name => Source_Array_Access);
procedure Free is new Ada.Unchecked_Deallocation
(Object => Type_Array, Name => Type_Array_Access);
procedure Free is new Ada.Unchecked_Deallocation
(Object => Severity_Array, Name => Severity_Array_Access);
procedure Free is new Ada.Unchecked_Deallocation
(Object => Orka.Unsigned_32_Array, Name => UInt_Array_Access);
procedure Free is new Ada.Unchecked_Deallocation
(Object => Size_Array, Name => Size_Array_Access);
begin
Length := Size (API.Get_Debug_Message_Log.Ref
(UInt (Number_Messages), Log_Length,
Sources, Types, IDs, Levels, Lengths, Log));
pragma Assert (Length <= Number_Messages);
declare
Messages : Message_Array (1 .. Length);
Offset : Natural := 1;
begin
for Index in 1 .. Length loop
Messages (Index) :=
(From => Sources (Index),
Kind => Types (Index),
Level => Levels (Index),
ID => IDs (Index),
Message => String_Holder.To_Holder
(Log (Offset .. Offset + Natural (Lengths (Index)) - 1)));
Offset := Offset + Natural (Lengths (Index));
end loop;
Free (Sources);
Free (Types);
Free (Levels);
Free (IDs);
Free (Lengths);
Free (Log);
return Messages;
end;
end Message_Log;
function Logged_Messages return Size is
Result : Int := 0;
begin
API.Get_Integer.Ref (Enums.Getter.Debug_Logged_Messages, Result);
return Result;
end Logged_Messages;
end GL.Debug.Logs;
|
gcmurphy/Amass | Ada | 4,174 | ads | -- Copyright 2021 Jeff Foley. All rights reserved.
-- Use of this source code is governed by Apache 2 LICENSE that can be found in the LICENSE file.
local json = require("json")
name = "BGPView"
type = "api"
function start()
setratelimit(1)
end
function asn(ctx, addr, asn)
local cfg = datasrc_config()
if (cfg == nil) then
return
end
local prefix
if (asn == 0) then
if (addr == "") then
return
end
local ip, prefix = getcidr(ctx, addr, cfg.ttl)
if (ip == "") then
return
end
asn = getasn(ctx, ip, prefix, cfg.ttl)
if (asn == 0) then
return
end
end
local a = asinfo(ctx, asn, cfg.ttl)
if (a == nil) then
return
end
local cidrs = netblocks(ctx, asn, cfg.ttl)
if (cidrs == nil or #cidrs == 0) then
return
end
if (prefix == "") then
prefix = cidrs[1]
parts = split(prefix, "/")
addr = parts[1]
end
newasn(ctx, {
['addr']=addr,
['asn']=asn,
['prefix']=prefix,
['cc']=a.cc,
['registry']=a.registry,
['desc']=a.desc,
['netblocks']=cidrs,
})
end
function getcidr(ctx, addr, ttl)
local resp = cacherequest(ctx, "https://api.bgpview.io/ip/" .. addr, ttl)
if (resp == "") then
return "", 0
end
local j = json.decode(resp)
if (j == nil or j.status ~= "ok" or j.status_message ~= "Query was successful") then
return "", 0
end
local ip = j.data.rir_allocation.ip
local cidr = j.data.rir_allocation.cidr
return ip, cidr
end
function getasn(ctx, ip, cidr, ttl)
local u = "https://api.bgpview.io/prefix/" .. ip .. "/" .. tostring(cidr)
local resp = cacherequest(ctx, u, ttl)
if resp == "" then
return 0
end
local j = json.decode(resp)
if (j == nil or j.status ~= "ok" or j.status_message ~= "Query was successful") then
return 0
end
local last = #(j.data.asns)
if (last == 0) then
return 0
end
return j.data.asns[last].asn
end
function asinfo(ctx, asn, ttl)
resp = cacherequest(ctx, "https://api.bgpview.io/asn/" .. tostring(asn), ttl)
if (resp == "") then
return nil
end
j = json.decode(resp)
if (j == nil or j.status ~= "ok" or j.status_message ~= "Query was successful") then
return nil
end
local registry = ""
if (#(j.data.rir_allocation) > 0) then
registry = j.data.rir_allocation.rir_name
end
local name = ""
if (j.data.name ~= nil) then
name = name .. j.data.name
end
if (j.data.description_full ~= nil) then
name = name .. " -"
for _, desc in pairs(j.data.description_full) do
name = name .. " " .. desc
end
end
return {
['asn']=asn,
desc=name,
cc=j.data.country_code,
['registry']=registry,
}
end
function netblocks(ctx, asn, ttl)
local u = "https://api.bgpview.io/asn/" .. tostring(asn) .. "/prefixes"
local resp = cacherequest(ctx, u, ttl)
if (resp == "") then
return nil
end
local j = json.decode(resp)
if (j == nil or j.status ~= "ok" or j.status_message ~= "Query was successful") then
return nil
end
local netblocks = {}
for i, p in pairs(j.data.ipv4_prefixes) do
table.insert(netblocks, p.ip .. "/" .. tostring(p.cidr))
end
for i, p in pairs(j.data.ipv6_prefixes) do
table.insert(netblocks, p.ip .. "/" .. tostring(p.cidr))
end
return netblocks
end
function cacherequest(ctx, url, ttl)
local resp, err = request(ctx, {
['url']=url,
headers={['Content-Type']="application/json"},
})
if (err ~= nil and err ~= "") then
return ""
end
return resp
end
function split(str, delim)
local result = {}
local pattern = "[^%" .. delim .. "]+"
local matches = find(str, pattern)
if (matches == nil or #matches == 0) then
return result
end
for i, match in pairs(matches) do
table.insert(result, match)
end
return result
end
|
BrickBot/Bound-T-H8-300 | Ada | 53,732 | adb | -- Symbols (body)
--
-- Symbolic information associated with a target program.
--
-- A component of the Bound-T Worst-Case Execution Time Tool.
--
-------------------------------------------------------------------------------
-- Copyright (c) 1999 .. 2015 Tidorum Ltd
-- All rights reserved.
--
-- Redistribution and use in source and binary forms, with or without
-- modification, are permitted provided that the following conditions are met:
--
-- 1. Redistributions of source code must retain the above copyright notice, this
-- list of conditions and the following disclaimer.
-- 2. Redistributions in binary form must reproduce the above copyright notice,
-- this list of conditions and the following disclaimer in the documentation
-- and/or other materials provided with the distribution.
--
-- This software is provided by the copyright holders and contributors "as is" and
-- any express or implied warranties, including, but not limited to, the implied
-- warranties of merchantability and fitness for a particular purpose are
-- disclaimed. In no event shall the copyright owner or contributors be liable for
-- any direct, indirect, incidental, special, exemplary, or consequential damages
-- (including, but not limited to, procurement of substitute goods or services;
-- loss of use, data, or profits; or business interruption) however caused and
-- on any theory of liability, whether in contract, strict liability, or tort
-- (including negligence or otherwise) arising in any way out of the use of this
-- software, even if advised of the possibility of such damage.
--
-- Other modules (files) of this software composition should contain their
-- own copyright statements, which may have different copyright and usage
-- conditions. The above conditions apply to this file.
-------------------------------------------------------------------------------
--
-- $Revision: 1.36 $
-- $Date: 2015/10/24 20:05:52 $
--
-- $Log: symbols.adb,v $
-- Revision 1.36 2015/10/24 20:05:52 niklas
-- Moved to free licence.
--
-- Revision 1.35 2009-03-24 07:48:35 niklas
-- BT-CH-0166: String_Pool.Item_T for source-file and marker names.
--
-- Revision 1.34 2009/03/20 18:19:30 niklas
-- BT-CH-0164: Assertion context identified by source-line number.
--
-- Revision 1.33 2008/10/11 08:16:14 niklas
-- BT-CH-0148: Symbols from text files and the -symbols option.
--
-- Revision 1.32 2007/08/17 21:30:34 niklas
-- Added function Equal for Connection_T.
-- Extended procedure Insert to issue "Duplicated symbol" warnings
-- only when the same symbol is defined with a non-Equal value, and
-- to issue just a Note when the new value Equals the old one.
--
-- Revision 1.31 2007/08/14 12:36:38 niklas
-- BT-CH-0072: Corrections to handling ambiguous names.
--
-- Revision 1.30 2007/08/13 09:01:34 niklas
-- BT-CH-0070: Tracing symbol scopes. Warn re duplicated symbol.
--
-- Revision 1.29 2007/05/03 07:26:26 niklas
-- Added two variants of Connect_Subprogram using Scope_T.
--
-- Revision 1.28 2007/04/26 11:28:05 niklas
-- BT-CH-0059.
--
-- Revision 1.27 2007/02/24 09:51:53 niklas
-- BT-CH-0046.
--
-- Revision 1.26 2006/05/08 13:12:19 niklas
-- Changed Connect_Line to accept Scopes with depth >= 1 and emit
-- only a Note (not a Fault) if Scope < 2. This still happens for
-- 8051/IAR programs, where it would be a bit difficult to get the
-- subprogram name for level 2, and Output usually knows the
-- subprogram name anyway.
--
-- Revision 1.25 2006/04/28 09:19:46 niklas
-- Changed function Name_Of (Level, Scope) to emit a Fault
-- instead of raising Constraint_Error for an invalid level.
-- Extended Connect_Line to emit a fault if the scope has
-- less than two levels (source file, subprogram).
--
-- Revision 1.24 2005/10/09 08:10:24 niklas
-- BT-CH-0013.
--
-- Revision 1.23 2005/06/28 14:19:23 niklas
-- Fixed function Variable_Connections to use the "variable" Kind
-- instead of the "label" Kind.
--
-- Revision 1.22 2005/04/17 08:05:13 niklas
-- Changed problems with wrongly or too deeply nested scopes
-- to report Fault instead of Error.
--
-- Revision 1.21 2005/02/20 15:15:37 niklas
-- BT-CH-0004.
--
-- Revision 1.20 2004/04/25 13:37:54 niklas
-- First Tidorum version.
-- Replaced "Cell" connections by "Variable" connections that use
-- Storage.Location_T and thus allow the mapping from variable to cell
-- to depend on code address.
-- Added operations to find the source lines that surround a given code
-- address (approximate source-line identification).
--
-- Revision 1.19 2003/02/27 14:40:13 holsti
-- Duplicated symbols are reported as Warnings (not Notes) but the
-- warnings are conditional on Opt.Warn_Duplicated_Symbol.
--
-- Revision 1.18 2001/11/19 11:24:44 saarinen
-- Modified "Duplicate Symbol" Errors into Notes to reduce the number
-- of error messages.
--
-- Revision 1.17 2001/06/09 16:32:01 holsti
-- Added Connect_Subprogram variant with Giving parameter.
--
-- Revision 1.16 2001/04/10 12:59:10 ville
-- Added subroutines Connect_Label and Label_Connections
--
-- Revision 1.15 2001/03/21 20:30:33 holsti
-- Name_Of scope-level added. Symbols.Lines omitted.
--
-- Revision 1.14 2001/03/02 09:01:15 holsti
-- Default scope delimiter changed to vertical bar.
--
-- Revision 1.13 2000/12/28 19:47:00 holsti
-- Scope_Of allows empty scope (NC_043).
-- Connections_For_Symbol and Connections_For_Line removed (unused).
--
-- Revision 1.12 2000/12/22 13:37:02 sihvo
-- Added line numbers.
--
-- Revision 1.11 2000/12/04 08:09:27 sihvo
-- Changed Hash to Bags. Added variables to symbol table.
--
-- Revision 1.10 2000/11/22 22:30:21 holsti
-- Using Processor.Code_Address_T instead of Processor.Address_T.
-- Comments updated re Connection_T attributes for various symbols.
--
-- Revision 1.9 2000/11/07 11:40:54 ville
-- Add_Address call deleted from Connect_Cell
--
-- Revision 1.8 2000/11/06 12:37:12 langback
-- Replaced Connect with separate routines Connect_Subprogram and
-- Connect_Cell. No routine for Label's yet.
--
-- Revision 1.7 2000/10/25 14:22:29 langback
-- Added stub for function "Variable_Cell". Proper implementation needed.
--
-- Revision 1.6 2000/08/25 06:44:51 parviain
-- Fixed function Address_Less.
--
-- Revision 1.5 2000/07/13 11:24:16 saarinen
-- Added hash-table for Code_Addresses and implemented
-- Connections_For_Address.
--
-- Revision 1.4 2000/07/04 11:23:06 saarinen
-- Moved functions Name_Of and Scope_Of from Programs to here.
--
-- Revision 1.3 2000/05/05 12:11:22 holsti
-- Symbols.Opt controls tracing output.
--
-- Revision 1.2 2000/05/02 19:41:30 holsti
-- String_Pool added, Symbols partly implemented.
--
-- Revision 1.1 2000/04/24 14:28:39 holsti
-- Symbol scopes added.
--
with Ada.Strings.Fixed;
with Ada.Strings.Unbounded;
with Bags; -- MW components.
with Bags.Bounded_Operations; -- MW components.
with Output;
with Symbols.Opt;
with Table_Of_Strings_And_Static_Values_G; -- LGL components.
package body Symbols is
use Ada.Strings.Unbounded;
use type String_Pool.Item_T;
--
--- Equality of Connection_T
--
function Equal (Left, Right : Connection_T)
return Boolean
--
-- Whether the two connections are equivalent, that is, of
-- equal meaning after accesses are dereferenced.
--
is
use type Processor.Code_Address_T;
use type Storage.Location_T;
begin
-- The following uses the reference-uniqueness of Scope_T:
if Left.Kind /= Right.Kind
or Left.Scope /= Right.Scope
then
return False;
else
-- The following uses the reference-uniqueness
-- of String_Pool.Item_T, for Name and Var_Name:
case Left.Kind is
when Subprogram | Label =>
return Left.Name = Right.Name
and Left.Address = Right.Address;
when Variable =>
return Left.Var_Name = Right.Var_Name
and Left.Location.all = Right.Location.all;
when Line_Number =>
return Left.Line_Number = Right.Line_Number
and Left.Line_Address = Right.Line_Address;
end case;
end if;
end Equal;
--
--- String / level lists
--
function Image (
Strings : Level_List_T;
Delimiter : Character := Default_Delimiter)
return String
--
-- The Strings concatenated in index order, separated
-- by the Delimiter.
--
is
Result : Unbounded_String;
-- The result, initially null.
begin
for S in Strings'Range loop
Append (Result, String_Pool.To_String (Strings(S)));
if S < Strings'Last then
Append (Result, Delimiter);
end if;
end loop;
return To_String (Result);
end Image;
type Relation_T is (Less, Equal, Greater);
--
-- The result of a relational operator.
function Lex_Relation (Left, Right : Level_List_T) return Relation_T
--
-- Lexicographic relation on string (Level) lists.
--
is
L : Positive := Left'First;
R : Positive := Right'First;
begin
loop
-- Invariant: for all indices I < L and J < R,
-- Left(I) = Right(J).
if L > Left'Last and R > Right'Last then
return Equal;
elsif L > Left'Last then
-- Left is true prefix of Right.
return Less;
elsif R > Right'Last then
-- Right is a true prefix of Left.
return Greater;
elsif Left (L) < Right(R) then return Less;
elsif Right(R) < Left (L) then return Greater;
else
-- Left(L) = Right(R). Undecided still.
L := L + 1;
R := R + 1;
end if;
end loop;
end Lex_Relation;
function Lex_Less (Left, Right : Level_List_T) return Boolean
--
-- Lexicographic "<".
--
is
begin
return Lex_Relation (Left, Right) = Less;
end Lex_Less;
function Shared_Suffix_Length (Left, Right : Level_List_T)
return Natural
--
-- Return the largest value L such that the length-L suffixes of
-- Left and Right are equal.
--
is
L : Natural := Left'Last;
R : Natural := Right'Last;
begin
loop
if (L < Left'First or R < Right'First)
or else Left(L) /= Right(R) then
return Left'Last - L;
end if;
L := L - 1;
R := R - 1;
end loop;
end Shared_Suffix_Length;
function Is_Suffix (Suffix, Whole : Level_List_T) return Boolean
--
-- Whether one string-list (Suffix) is a suffix of another (Whole)
-- or is equal to it.
--
is
F : Positive;
begin
if Suffix'Length > Whole'Length then
return False;
else
F := Whole'Last - Suffix'Length + 1;
return Whole(F .. Whole'Last) = Suffix;
end if;
end Is_Suffix;
--
-- Forward declarations
--
function To_Scope (Nest : Level_List_T) return Scope_T;
--
-- The Scope for the given Nest of levels.
--
--- Scopes
--
function Depth (Scope : Scope_T) return Natural
is
begin
return Scope'Length;
end Depth;
function Name_Of (
Level : Positive;
Within : Scope_T)
return String_Pool.Item_T
--
-- The name of the chosen level within the given scope.
-- The Level must be in 1 .. Depth, else a Fault is reported
-- and the null string "" returned.
--
is
begin
if Level in Within'Range then
return Within(Level);
else
Output.Fault (
Location => "Symbols.Name_Of (Level, Scope)",
Text =>
"Level"
& Positive'Image (Level)
& " > depth"
& Natural'Image (Within'Length)
& Output.Field_Separator
& Image (Within));
return String_Pool.To_Item ("");
end if;
end Name_Of;
function Name_Of (
Level : Positive;
Within : Scope_T)
return String
is
begin
return String_Pool.To_String (Name_Of (Level, Within));
end Name_Of;
function Deepest (Scope : Scope_T) return String
is
begin
return String_Pool.To_String (Scope(Scope'Last));
exception
when Constraint_Error =>
Output.Fault (
Location => "Symbols.Deepest",
Text =>
"Accessing Deepest level of null scope with depth ="
& Natural'Image (Scope'Length));
raise;
end Deepest;
function Image (
Scope : Scope_T;
Delimiter : Character := Default_Delimiter)
return String
is
begin
return Image (
Strings => Scope.all,
Delimiter => Delimiter);
end Image;
function Scope (Identifier : String) return Scope_T
is
begin
return To_Scope (Nest => (1 => String_Pool.To_Item (Identifier)));
end Scope;
function Scope_Of (
Identifier : String;
Delimiter : Character := Default_Delimiter)
return Scope_T
is
use Ada.Strings.Fixed;
Delim : constant String := (1 => Delimiter);
Stack : Scope_Stack_T;
First : Positive := Identifier'First;
Last : constant Natural := Identifier'Last;
Del : Natural;
begin
loop
-- Find next delimiter, exit if there is none:
Del := Index (Identifier(First .. Last), Delim);
exit when Del = 0;
-- Push the delimited name on the scope stack:
Nest (
Level => Identifier (First .. Del - 1),
Scope => Stack);
First := Del + 1;
end loop;
return To_Scope (Stack);
end Scope_Of;
function Name_Of (
Identifier : String;
Delimiter : Character := Default_Delimiter)
return String
is
use Ada.Strings.Fixed;
Del : Natural;
begin
Del := Index (
Source => Identifier,
Pattern => (1 => Delimiter),
Going => Ada.Strings.Backward);
if Del = 0 then
return Identifier;
else
return Identifier (Del + 1 .. Identifier'Last);
end if;
end Name_Of;
--
--- Scope stacks
--
use Level_Vectors;
procedure Make_Global (Scope : in out Scope_Stack_T)
is
begin
Truncate_Length (Vector => Scope.Stack, To => 0);
end Make_Global;
function Depth (Scope : Scope_Stack_T) return Natural
is
begin
return Length (Scope.Stack);
end Depth;
procedure Nest (
Level : in String;
Scope : in out Scope_Stack_T)
is
begin
Append (To => Scope.Stack, Value => String_Pool.To_Item (Level));
end Nest;
procedure Unnest (Scope : in out Scope_Stack_T)
is
begin
if Length (Scope.Stack) > 0 then
Drop (Index => Last (Scope.Stack), From => Scope.Stack);
else
Output.Fault (
Location => "Symbols.Unnest",
Text =>
"Tried to unnest a null scope with depth ="
& Natural'Image (Depth (Scope)));
raise Constraint_Error;
end if;
end Unnest;
procedure Unnest (
Level : in String;
Scope : in out Scope_Stack_T)
is
begin
if Element (Scope.Stack, Last (Scope.Stack)) /= Level then
Output.Warning (Text =>
"Closing scope " & Level
& " but current scope is " & Deepest (Scope));
end if;
Unnest (Scope);
end Unnest;
function Deepest (Scope : Scope_Stack_T) return String
is
begin
return String_Pool.To_String (Element (Scope.Stack, Last (Scope.Stack)));
end Deepest;
function Image (
Scope : Scope_Stack_T;
Delimiter : Character := Default_Delimiter)
return String
is
begin
return Image (To_Vector (Scope.Stack), Delimiter);
end Image;
package Scope_Table is new Table_Of_Strings_And_Static_Values_G (
Character_Type => String_Pool.Item_T,
String_Type => Level_List_T,
Less => Lex_Less,
Equals => "=",
Value_Type => Scope_T);
--
-- All scopes associated with symbols are stored in the Scope_Table,
-- so that each distinct scope is represented by a unique Scope_T
-- value.
Scopes : Scope_Table.Table_Type;
--
-- The table of scopes, used to assign unique, compact identifiers
-- to each scope nest that is used.
--
-- The default initial value is the empty table.
function To_Scope (Nest : Level_List_T) return Scope_T
--
-- The Scope for the given Nest of levels.
--
is
Scope : Scope_T;
-- The return value.
begin
-- Look up the level-nest in the scope table:
Scope_Table.Get_Value (
Table => Scopes,
Key => Nest,
Value => Scope);
-- This nest is already in the table.
return Scope;
exception
when Scope_Table.Missing_Item_Error =>
-- New scope. Insert in table.
if Opt.Trace_Scopes then
Output.Trace (
"New scope """
& Image (Nest)
& '"');
end if;
Scope := new Level_List_T'(Nest);
Scope_Table.Insert (
Table => Scopes,
Key => Scope.all,
Value => Scope);
return Scope;
end To_Scope;
function To_Scope (Stack : Scope_Stack_T) return Scope_T
is
begin
return To_Scope (Nest => To_Vector (Stack.Stack));
end To_Scope;
procedure Discard (Item : in out Scope_Stack_T)
is
begin
Erase (Item.Stack);
end Discard;
--
--- Connections of symbols to addresses etc.
--
function To_Source_File_Name (Name : String) return Source_File_Name_T
is
begin
if Name'Length = 0 then
return Null_Name;
else
return To_Item (Name);
end if;
end To_Source_File_Name;
function Image (Name : Source_File_Name_T) return String
is
begin
if Name = Null_Name then
return "";
else
return To_String (Name);
end if;
end Image;
function Image (Item : Line_Number_T) return String
renames Output.Image;
function Image (Item : Connection_T) return String
is
Name : constant String :=
Output.Field_Separator
& Scoped_Name_Of (Item)
& Output.Field_Separator;
-- The middle field, with both its separators.
begin
case Item.Kind is
when Subprogram =>
return "Subprogram"
& Name
& Processor.Image (Item.Address);
when Label =>
return "Label"
& Name
& Processor.Image (Item.Address);
when Variable =>
return "Variable"
& Name
& Storage.Image (Item.Location);
when Line_Number =>
return "Source line"
& Name
& Processor.Image (Item.Line_Address);
end case;
end Image;
function Full_Key (Item : Connection_T) return Level_List_T
--
-- The full key consists of the scope levels (top down)
-- followed by the identifier name.
--
is
begin
return Item.Scope.all
& (1 => String_Pool.To_Item (Name_Of (Item)));
end Full_Key;
function Kind_Of (Connection : Connection_T) return Connection_Kind_T
is
begin
return Connection.Kind;
end Kind_Of;
function Scope_Of (Connection : Connection_T) return Scope_T
is
begin
return Connection.Scope;
end Scope_Of;
function Name_Of (Connection : Connection_T) return String
is
begin
case Connection.Kind is
when Subprogram | Label =>
return String_Pool.To_String (Connection.Name);
when Variable =>
return String_Pool.To_String (Connection.Var_Name);
when Line_Number =>
return Image (Connection.Line_Number);
end case;
end Name_Of;
function Scoped_Name_Of (
Connection : Connection_T;
Delimiter : Character := Default_Delimiter)
return String
is
Scope : constant String := Image (Scope_Of (Connection), Delimiter);
-- The scope part.
begin
if Scope'Length = 0 then
-- There is no scope.
return Name_Of (Connection);
else
return Scope & Delimiter & Name_Of (Connection);
end if;
end Scoped_Name_Of;
function Source_File_Of (Connection : Connection_T)
return Source_File_Name_T
is
begin
return Source_File_Name_T (String_Pool.Item_T'(Name_Of (
Level => 1,
Within => Connection.Scope)));
end Source_File_Of;
function Source_File_Of (Connection : Connection_T)
return String
is
begin
return Name_Of (Level => 1, Within => Connection.Scope);
end Source_File_Of;
function Line_Number_Of (Connection : Connection_T)
return Line_Number_T
is
begin
return Connection.Line_Number;
end Line_Number_Of;
function Line_Number_Of (Connection : Connection_T)
return String
is
begin
return Image (Connection.Line_Number);
end Line_Number_Of;
function Address_Of (Connection : Connection_T)
return Processor.Code_Address_T
is
begin
if Connection.Kind = Line_Number then
return Connection.Line_Address;
else
return Connection.Address;
end if;
end Address_Of;
function No_Code_Addresses return Code_Address_List_T
is
None : Code_Address_List_T (1 .. 0);
begin
return None;
end No_Code_Addresses;
procedure Swap (This, That : in out Processor.Code_Address_T)
--
-- A straight swap.
--
is
Holder : Processor.Code_Address_T;
begin
Holder := This;
This := That;
That := Holder;
end Swap;
function Addresses_Of (Connections : Connection_Set_T)
return Code_Address_List_T
is
use type Processor.Code_Address_T;
List : Code_Address_List_T (1 .. Connections'Length);
Last : Natural := 0;
-- The result will be List(1 .. Last), in increasing order.
Addr : Processor.Code_Address_T;
-- The address of a connection.
Dup : Boolean;
-- Whether Addr duplicates an address already in the List.
begin
-- This is a "square" implementation. Blushes.
for C in Connections'Range loop
Addr := Address_Of (Connections(C));
Dup := False;
Insertion : for L in 1 .. Last loop
-- Addr is a code-address to be inserted in the list.
-- It can be the address of Connections(C) or an address
-- from the List that was displaced when Connections(C)
-- or the earlier Addr value was put in the List at the
-- suitable place, according to "<".
Dup := Addr = List(L);
exit Insertion when Dup;
if Addr < List(L) then
-- Addr goes here.
Swap (Addr, List(L));
end if;
end loop Insertion;
if not Dup then
-- The List lengthens.
Last := Last + 1;
List(Last) := Addr;
end if;
end loop;
return List(1 .. Last);
end Addresses_Of;
function Location_Of (Connection : Connection_T)
return Processor.Cell_Spec_T
is
begin
return Storage.Spec_Of (
Connection.Location(Connection.Location'First).Cell);
end Location_Of;
function Location_Of (Connection : Connection_T)
return Storage.Location_Ref
is
begin
return Connection.Location;
end Location_Of;
--
--- Symbol tables
--
-- Symbolic name --> Machine address
--
-- Tables to map symbolic names (in scopes) to machine address are
-- defined here below.
--
-- Each symbol is tabled with a key containin the least number of
-- scope levels (from deepest upwards) that are needed to identify
-- the symbol unambiguously.
--
-- For example, consider the symbol S in scope A:B:C.
-- If S is a unique name even without scope qualification, the
-- symbol is stored with the key S (the stored value contains the
-- scope A:B:C, too). Uniqueness means that there is no other
-- symbol with name S, in any scope. If S is not unique in this
-- sense, the symbol is stored with the key C:S, or B:C:S, or A:B:C:S,
-- whichever is the shortest unique key. For shorter (ambiguous) keys,
-- an "unresolved" entry is tabled.
--
-- When a symbol is looked up from the table, the same sequence
-- of keys is used: a first look-up uses just the symbol name, and
-- if an "unresolved" entry is found, successive scope levels are
-- included until the symbol is resolved.
type Table_Value_T (Kind : Value_Kind_T := Unresolved) is record
case Kind is
when Unresolved =>
null;
when Suffix_Key | Full_Key =>
Connection : Connection_T;
end case;
end record;
function Image (Item : Table_Value_T) return String
--
-- For human understanding.
--
is
Kind : constant String := Value_Kind_T'Image (Item.Kind);
begin
case Item.Kind is
when Unresolved =>
return Kind;
when Suffix_Key | Full_Key =>
return Kind & '(' & Image (Item.Connection) & ')';
end case;
end Image;
package Connection_Table is new Table_Of_Strings_And_Static_Values_G (
Character_Type => String_Pool.Item_T,
String_Type => Level_List_T,
Less => Lex_Less,
Equals => "=",
Value_Type => Table_Value_T);
--
-- Tables to map (Scope, Name) -> Connection.
package Address_Bags is new Bags (
Key_Type => Processor.Code_Address_T,
Item_Type => Connection_T,
Key_Of => Address_Of,
"<" => Processor."<",
"=" => Processor."=",
Count => Natural);
--
-- Table to map Address -> Connection.
package Address_Bags_Bounded_Operations
is new Address_Bags.Bounded_Operations;
--
-- Traversal of Address-orded connections in selected
-- bounded ranges of Address.
package Cell_Spec_Bags is new Bags (
Key_Type => Processor.Cell_Spec_T,
Item_Type => Connection_T,
Key_Of => Spec_Of,
"<" => Processor."<",
"=" => Processor."=",
Count => Natural);
--
-- Table to map Cell_Spec -> Connection.
--
-- TBM to structure (automaton) for tracking the connections reached
-- by access paths, depending on the execution point.
function Shared_Suffix_Length (Left, Right : Scope_T)
return Natural
--
-- Return the largest value L such that the length-L suffixes of
-- the level-name sequences of Left and Right are equal.
--
is
begin
return Shared_Suffix_Length (
Left => Left.all,
Right => Right.all);
end Shared_Suffix_Length;
type Connection_Tables_T is
array (Connection_Kind_T) of Connection_Table.Table_Type;
--
-- A set of tables symbol->connection, for the several
-- kinds of connections.
type Symbol_Table_Object_T is record
Tables : Connection_Tables_T;
Address_Table : Address_Bags.Bag (Duplicate_Keys_Allowed => True);
Cell_Spec_Table : Cell_Spec_Bags.Bag (Duplicate_Keys_Allowed => True);
--TBA: types etc.
end record;
--
-- The symbol tables for one program under analysis.
Null_Connections : Connection_Set_T (1..0);
--
-- The empty set of connections.
procedure Erase (Table : in out Symbol_Table_T)
is
begin
if Table /= null then
for T in Table.Tables'range loop
Connection_Table.Destroy (Table.Tables(T));
end loop;
Address_Bags.Destroy (Table.Address_Table);
Cell_Spec_Bags.Destroy (Table.Cell_Spec_Table);
else
Table := new Symbol_Table_Object_T;
end if;
end Erase;
procedure Insert_Qualified (
Into : in out Connection_Table.Table_Type;
Key_A : in Level_List_T;
Conn_A : in Connection_T;
Key_B : in Level_List_T;
Conn_B : in Connection_T;
Min_Suffix : in Positive);
--
-- Handles the collision of two connection-table entries with
-- some amount of shared key suffix.
--
-- It is assumed that the older entry (type Suffix_Key) has already
-- been removed from the table, and the task is to insert both the
-- old and the new entry with keys long enough to distinguish them,
-- and to add Unresolved entries for shorter keys, down to a key
-- length of Min_Suffix.
procedure Insert (
Key : in Level_List_T;
Connection : in Connection_T;
Min_Suffix : in Positive := 1;
Into : in out Connection_Table.Table_Type)
--
-- Insert a Key and Connection in a table, using the shortest suffix
-- of the key that unambiguously identifies the entry, but is
-- at least of length Min_Suffix.
-- The full Key is used if Min_Suffix >= Key'Length.
--
-- If there already is an entry that shares a key suffix with the
-- new entry, the old entry is updated (reinserted with a longer
-- suffix).
--
-- If the table already contains an entry with the same Key, an
-- error message is emitted and the table is unchanged.
--
is
First_Suffix_Length : constant Positive :=
Positive'Min (Min_Suffix, Key'Length);
-- The first (perhaps only) suffix-length to be tried.
First : Positive range Key'Range;
Last : constant Positive range Key'Range := Key'Last;
-- The key suffix under consideration is Key(First .. Last).
Value : Table_Value_T;
-- The value to be inserted.
Duplicate : Boolean;
-- The table already contains an entry with this key (suffix).
Dup_Value : Table_Value_T;
-- The value of the old entry.
procedure Report_Duplicate
--
-- Reports that the new Key:Connection defines a symbol with
-- the same Key as the Dup_Value, which is a Full_Key or
-- a Suffix_Key.
--
is
begin
if Equal (Connection, Dup_Value.Connection) then
-- Duplicated definition with same value.
Output.Note (
"Duplicated symbol and value"
& Output.Field_Separator
& Image (Connection));
elsif Opt.Warn_Duplicated_Symbol then
-- Duplicated definition with different value, and
-- user wants to be warned about such.
Output.Warning (
"Duplicated symbol"
& Output.Field_Separator
& Image (Connection)
& Output.Field_Separator
& Image (Dup_Value.Connection));
end if;
end Report_Duplicate;
begin -- Insert
-- The insertion proceeds incrementally, trying to insert
-- the connection with increasing suffixes of the full key,
-- by default starting with a minimum suffix length of 1.
--
-- When trying to insert with a suffix Ks, and there already
-- is a table entry E with the key Ks, the following happens:
--
-- > If E is "Unresolved", and Ks is not the full K,
-- the insertion continues with the next longer suffix.
-- If Ks = K, the "Unresolved" entry is removed and the
-- connection is inserted with key K as "Full_Key".
--
-- > If E is "Full_Key", and Ks is not the full K,
-- the insertion continues with the next longer suffix.
-- If Ks = K, there is a key collision; an error
-- message is emitted and the connection is not inserted.
--
-- > If E is "Suffix_Key", let Ke be the full key of E as
-- computed from its scope and name.
-- If Ke = K, there is a key collision; an error
-- message is emitted and the connection is not inserted.
-- If Ke /= K, the old entry E is removed and the two
-- entries (old and new) are (re)inserted with sufficiently
-- long keys by Insert_Qualified, which see.
if Opt.Trace_Insertion then
Output.Trace (
"Inserting symbol """
& Image (Key)
& """ for "
& Image (Connection));
end if;
Suffix_Increments:
for Suffix_Length in First_Suffix_Length .. Key'Length loop
First := Key'Last - Suffix_Length + 1;
-- See if we have the full key or a (true) suffix of it:
if First = Key'First then
Value := (Kind => Full_Key,
Connection => Connection);
else
Value := (Kind => Suffix_Key,
Connection => Connection);
end if;
if Opt.Trace_Insertion then
Output.Trace ("Key suffix " & Image (Key(First..Last)));
end if;
-- Try to insert with this part of the key:
Connection_Table.Insert (
Table => Into,
Key => Key (First .. Last),
Value => Value,
Duplicate_Item => Duplicate);
if not Duplicate then
-- The new connection was inserted, no problem.
if Opt.Trace_Insertion then
Output.Trace ("Inserted " & Image (Value));
end if;
exit Suffix_Increments;
else
-- Inspect the existing connection:
Dup_Value := Connection_Table.Value (
Table => Into,
Key => Key (First .. Last));
if Opt.Trace_Insertion then
Output.Trace ("Duplicate key " & Image (Dup_Value));
end if;
case Dup_Value.Kind is
when Unresolved =>
if Value.Kind = Full_Key then
-- Replace Unresolved entry with Full_Key entry.
Connection_Table.Replace_Value (
Table => Into,
Key => Key,
Value => Value);
exit Suffix_Increments;
end if;
when Full_Key =>
if Value.Kind = Full_Key then
-- Report duplicate key and quit.
Report_Duplicate;
return;
end if;
when Suffix_Key =>
if Dup_Value.Connection.Scope = Connection.Scope then
-- Same scopes, thus same full keys.
-- Report duplicate key and quit.
Report_Duplicate;
return;
else
-- Keys are distinct but have a common suffix.
-- Remove the old entry and (re)insert both the
-- old and new entries.
Connection_Table.Remove (
Table => Into,
Key => Key (First .. Last));
Insert_Qualified (
Into => Into,
Key_A => Full_Key (Dup_Value.Connection),
Conn_A => Dup_Value.Connection,
Key_B => Key,
Conn_B => Connection,
Min_Suffix => Suffix_Length);
exit Suffix_Increments;
end if;
end case;
end if;
end loop Suffix_Increments;
end Insert;
procedure Insert_Qualified (
Into : in out Connection_Table.Table_Type;
Key_A : in Level_List_T;
Conn_A : in Connection_T;
Key_B : in Level_List_T;
Conn_B : in Connection_T;
Min_Suffix : in Positive)
is
Shared_Len : constant Positive :=
Shared_Suffix_Length (Key_A, Key_B);
--
-- The length of the shared key suffix.
Max_Unresolved : constant Natural :=
Positive'Min (Shared_Len,
Positive'Min (Key_A'Length - 1,
Key_B'Length - 1));
--
-- The longest suffix length for which an Unresolved
-- entry is created (if the key is unused).
-- The key lengths (less 1) are placed as ceilings to
-- include the case where one key is a suffix of the
-- other.
First : Positive;
-- The shared suffix under consideration is
-- Key_B (First .. Key_B'Last).
Duplicate : Boolean;
-- An entry already exists for the suffix under consideration.
begin
-- Fill in new Unresolved entries:
for Suffix_Length in Min_Suffix .. Max_Unresolved loop
First := Key_B'Last - Suffix_Length + 1;
Connection_Table.Insert (
Table => Into,
Key => Key_B (First .. Key_B'Last),
Value => (Kind => Unresolved),
Duplicate_Item => Duplicate);
-- A value may already exist for this key suffix.
-- This is acceptable; the purpose of the Unresolved
-- entries is just be place-holders.
-- Put (" Make Unresolved = " & Image(Key_B(First..Key_B'Last)));
-- if Duplicate then
-- Put (" (duplicate)");
-- end if;
-- New_Line;
end loop;
-- Insert the two connections, resolved on the next
-- scope level:
Insert (
Key => Key_A,
Connection => Conn_A,
Min_Suffix => Shared_Len + 1,
Into => Into);
Insert (
Key => Key_B,
Connection => Conn_B,
Min_Suffix => Shared_Len + 1,
Into => Into);
-- Put_Line ("End of Insert_Qualified.");
end Insert_Qualified;
procedure Connect_Subprogram (
Scope : in Scope_Stack_T;
Name : in String;
Address : in Processor.Code_Address_T;
Within : in Symbol_Table_T)
is
Connection : Connection_T (Subprogram);
-- The new connection (not used).
begin
Connect_Subprogram (
Scope => To_Scope (Scope),
Name => Name,
Address => Address,
Within => Within,
Giving => Connection);
end Connect_Subprogram;
procedure Connect_Subprogram (
Scope : in Scope_T;
Name : in String;
Address : in Processor.Code_Address_T;
Within : in Symbol_Table_T)
is
Connection : Connection_T (Subprogram);
-- The new connection (not used).
begin
Connect_Subprogram (
Scope => Scope,
Name => Name,
Address => Address,
Within => Within,
Giving => Connection);
end Connect_Subprogram;
procedure Connect_Subprogram (
Scope : in Scope_Stack_T;
Name : in String;
Address : in Processor.Code_Address_T;
Within : in Symbol_Table_T;
Giving : out Connection_T)
is
begin
Connect_Subprogram (
Scope => To_Scope (Scope),
Name => Name,
Address => Address,
Within => Within,
Giving => Giving);
end Connect_Subprogram;
procedure Connect_Subprogram (
Scope : in Scope_T;
Name : in String;
Address : in Processor.Code_Address_T;
Within : in Symbol_Table_T;
Giving : out Connection_T)
is
use Address_Bags;
begin
Giving := (
Kind => Subprogram,
Scope => Scope,
Name => String_Pool.To_Item (Name),
Address => Address);
if Opt.Trace then
Output.Trace (Text =>
Connection_Kind_T'Image (Subprogram)
& Output.Field_Separator
& Image (Full_Key (Giving))
& Output.Field_Separator
& Processor.Image (Address));
end if;
Insert (
Key => Full_Key (Giving),
Connection => Giving,
Min_Suffix => 1,
Into => Within.Tables(Subprogram));
Insert (
Item => Giving,
Into => Within.Address_Table);
end Connect_Subprogram;
procedure Connect_Label (
Scope : in Scope_Stack_T;
Name : in String;
Address : in Processor.Code_Address_T;
Within : in Symbol_Table_T)
is
use Address_Bags;
Connection : constant Connection_T (Label) := (
Kind => Label,
Scope => To_Scope (Scope),
Name => String_Pool.To_Item (Name),
Address => Address);
begin
if Opt.Trace then
Output.Trace (Text =>
Connection_Kind_T'Image (Label)
& Output.Field_Separator
& Image (Full_Key (Connection))
& Output.Field_Separator
& Processor.Image (Address));
end if;
Insert (
Key => Full_Key (Connection),
Connection => Connection,
Min_Suffix => 1,
Into => Within.Tables(Label));
Insert (
Item => Connection,
Into => Within.Address_Table);
end Connect_Label;
procedure Connect_Line (
Scope : in Scope_Stack_T;
Number : in Line_Number_T;
Address : in Processor.Code_Address_T;
Within : in Symbol_Table_T)
is
begin
Connect_Line (
Scope => To_Scope (Scope),
Number => Number,
Address => Address,
Within => Within);
end Connect_Line;
procedure Connect_Line (
Scope : in Scope_T;
Number : in Line_Number_T;
Address : in Processor.Code_Address_T;
Within : in Symbol_Table_T)
is
use Address_Bags;
Scope_Depth : constant Natural := Scope'Length;
Connection : constant Connection_T (Line_Number) := (
Kind => Line_Number,
Scope => Scope,
Line_Number => Number,
Line_Address => Address);
begin
if Opt.Trace then
Output.Trace (Text =>
Connection_Kind_T'Image (Line_Number)
& Output.Field_Separator
& Image (Full_Key (Connection))
& Output.Field_Separator
& Processor.Image (Address));
end if;
if Scope_Depth < 1
or (Scope_Depth < 2 and Opt.Warn_Shallow_Line_Scope)
then
-- Short on scope.
Output.Warning (
"Shallow scope for line-number "
& Image (Number)
& Output.Field_Separator
& Image (Scope));
end if;
if Scope_Depth > 0 then
-- Some scope.
Insert (
Item => Connection,
Into => Within.Address_Table);
end if;
end Connect_Line;
procedure Connect_Variable (
Scope : in Scope_Stack_T;
Name : in String;
Location : in Processor.Cell_Spec_T;
Within : in Symbol_Table_T)
is
begin
Connect_Variable (
Scope => To_Scope (Scope),
Name => Name,
Location => Location,
Within => Within);
end Connect_Variable;
procedure Connect_Variable (
Scope : in Scope_T;
Name : in String;
Location : in Processor.Cell_Spec_T;
Within : in Symbol_Table_T)
is
use Cell_Spec_Bags;
Connection : constant Connection_T (Cell) := (
Kind => Cell,
Scope => Scope,
Var_Name => String_Pool.To_Item (Name),
Location => new Storage.Location_T'(
Storage.Fixed_Location (Cell => Storage.Cell (Location))));
begin
if Opt.Trace then
Output.Trace (Text =>
Connection_Kind_T'Image (Cell)
& Output.Field_Separator
& Image (Full_Key (Connection))
& Output.Field_Separator
& Processor.Image (Location));
end if;
-- Insert (Scope, Name) -> Connection.
Insert (
Key => Full_Key (Connection),
Connection => Connection,
Min_Suffix => 1,
Into => Within.Tables(Cell));
-- Insert Cell_Spec -> Connection.
Insert (
Item => Connection,
Into => Within.Cell_Spec_Table);
end Connect_Variable;
procedure Connect_Variable (
Scope : in Scope_Stack_T;
Name : in String;
Location : in Storage.Location_T;
Within : in Symbol_Table_T)
is
use Cell_Spec_Bags;
Connection : constant Connection_T (Cell) := (
Kind => Cell,
Scope => To_Scope (Scope),
Var_Name => String_Pool.To_Item (Name),
Location => new Storage.Location_T'(Location));
begin
if Opt.Trace then
Output.Trace (Text =>
Connection_Kind_T'Image (Cell)
& Output.Field_Separator
& Image (Full_Key (Connection))
& Output.Field_Separator
& Storage.Image (Location));
end if;
-- Insert (Scope, Name) -> Connection.
Insert (
Key => Full_Key (Connection),
Connection => Connection,
Min_Suffix => 1,
Into => Within.Tables(Cell));
-- Insert Cell_Spec -> Connection.
Insert (
Item => Connection,
Into => Within.Cell_Spec_Table);
end Connect_Variable;
function No_Connections return Connection_Set_T
is
begin
return Null_Connections;
end No_Connections;
function Connections (
Key : Level_List_T;
Within : Connection_Table.Table_Type;
Kind : String)
return Connection_Set_T
--
-- Look up and return the connections for the Key.
-- In case of problems, use Kind in messages to report
-- the kind of element being sought (e.g. "subprogram").
--
is
Value : Table_Value_T;
begin
for K in reverse Key'range loop
Value := Connection_Table.Value (
Key => Key (K .. Key'Last),
Table => Within);
if Value.Kind = Unresolved then
-- Repeat loop to use more of the key.
null;
else
-- Resolved entry. Check keys.
declare
Value_Key : constant Level_List_T :=
Full_Key (Value.Connection);
begin
if Is_Suffix (Suffix => Key, Whole => Value_Key) then
-- Found it.
if Key'Length < Value_Key'Length then
-- Note use of abbreviated name.
Output.Note (
"Full " & Kind & " name"
& Output.Field_Separator
& Image (Value_Key));
end if;
return (1 => Value.Connection);
elsif Value.Kind = Full_Key then
-- Repeat loop to use more of the key.
null;
else
-- Not there.
return Null_Connections;
end if;
end;
end if;
end loop;
raise Ambiguous_Name;
exception
when Connection_Table.Missing_Item_Error =>
return Null_Connections;
end Connections;
function Subprogram_Connections (
Scope : Scope_T;
Name : String;
Within : Symbol_Table_T)
return Connection_Set_T
is
begin
return Connections (
Key => Scope.all
& (1 => String_Pool.To_Item (Name)),
Within => Within.Tables(Subprogram),
Kind => "subprogram");
end Subprogram_Connections;
function Variable_Connections (
Scope : Scope_T;
Name : String;
Within : Symbol_Table_T)
return Connection_Set_T
is
begin
return Connections (
Key => Scope.all
& (1 => String_Pool.To_Item (Name)),
Within => Within.Tables(Variable),
Kind => "variable");
end Variable_Connections;
function Label_Connections (
Scope : Scope_T;
Name : String;
Within : Symbol_Table_T)
return Connection_Set_T
is
begin
return Connections (
Key => Scope.all
& (1 => String_Pool.To_Item (Name)),
Within => Within.Tables(Label),
Kind => "label");
end Label_Connections;
function Connections_For_Address (
Address : Processor.Code_Address_T;
Within : Symbol_Table_T)
return Connection_Set_T
is
use Address_Bags;
Connection_List : constant List :=
Search (
Key => Address,
Within => Within.Address_Table);
begin
return Connection_Set_T ( Connection_List );
end Connections_For_Address;
function Lines_For_Address (
Address : Processor.Code_Address_T;
Within : Symbol_Table_T)
return Connection_Set_T
is
Conns : constant Connection_Set_T :=
Connections_For_Address (Address, Within);
-- All the connections, of any kind.
Lines : Connection_Set_T (1 .. Conns'Length);
Last : Natural := 0;
-- The line-number connections from Conns, listed
-- in the same order as Lines(1..Last).
begin
for C in Conns'Range loop
if Conns(C).Kind = Line_Number then
Last := Last + 1;
Lines(Last) := Conns(C);
end if;
end loop;
return Lines(1 .. Last);
end Lines_For_Address;
function Line_Before (
Address : Processor.Code_Address_T;
Within : Symbol_Table_T)
return Connection_Set_T
is
Line : Connection_T;
-- The result, if a line connection is found.
Found_One : exception;
-- Terminates the traversal when a line connection is found.
procedure Take_First_Line (Item : in Connection_T)
--
-- Traversal action: stores the first line connection in
-- Line and terminates the traversal.
--
is
begin
if Item.Kind = Line_Number then
-- Found one.
Line := Item;
raise Found_One;
end if;
end Take_First_Line;
procedure Find_Line_Before
is new Address_Bags_Bounded_Operations.Upper_Bounded_Traversal (
Action => Take_First_Line);
--
-- Traverses connections in address order, for all connections
-- with address less or equal to an upper bound, and stores
-- the first Line_Number connection in Line and terminates
-- traversal by Found_One. Returns normally if no Line_Number
-- connection was found.
begin -- Line_Before
Find_Line_Before (
On_Bag => Within.Address_Table,
Last => Address,
Order => Address_Bags.Descending);
-- Found no line at or before Address.
return Null_Connections;
exception
when Found_One =>
-- Found a Line.
return (1 => Line);
end Line_Before;
function Line_After (
Address : Processor.Code_Address_T;
Within : Symbol_Table_T)
return Connection_Set_T
is
Line : Connection_T;
-- The result, if a line connection is found.
Found_One : exception;
-- Terminates the traversal when a line connection is found.
procedure Take_First_Line (Item : in Connection_T)
--
-- Traversal action: stores the first line connection in
-- Line and terminates the traversal.
--
is
begin
if Item.Kind = Line_Number then
-- Found one.
Line := Item;
raise Found_One;
end if;
end Take_First_Line;
procedure Find_Line_After
is new Address_Bags_Bounded_Operations.Lower_Bounded_Traversal (
Action => Take_First_Line);
--
-- Traverses connections in address order, for all connections
-- with address greater or equal to a lower bound, and stores
-- the first Line_Number connection in Line and terminates
-- traversal by Found_One. Returns normally if no Line_Number
-- connection was found.
begin -- Line_After
Find_Line_After (
On_Bag => Within.Address_Table,
First => Address,
Order => Address_Bags.Ascending);
-- Found no line at or after Address.
return Null_Connections;
exception
when Found_One =>
-- Found a Line.
return (1 => Line);
end Line_After;
function Connections_For_Location (
Location : Processor.Cell_Spec_T;
Scope : Scope_T;
Within : Symbol_Table_T)
return Connection_Set_T
is
use Cell_Spec_Bags;
Connections : constant List :=
Search (
Key => Location,
Within => Within.Cell_Spec_Table);
-- All connections with the given cell spec.
Correct_Specs : Connection_Set_T ( 1 .. Connections'Last);
--
-- The connections for which scope and cell spec are the same
-- as the parameters.
Index : Natural := 0;
begin
for C in Connections'Range loop
if Scope_Of (Connections(C)) = Scope then
Index := Index + 1;
Correct_Specs(Index) := Connections(C);
end if;
end loop;
return Correct_Specs (1..Index);
end Connections_For_Location;
end Symbols;
|
stcarrez/dynamo | Ada | 8,013 | ads | ------------------------------------------------------------------------------
-- --
-- ASIS-for-GNAT IMPLEMENTATION COMPONENTS --
-- --
-- A 4 G . G N A T _ I N T --
-- --
-- S p e c --
-- --
-- Copyright (C) 1995-2008, Free Software Foundation, Inc. --
-- --
-- ASIS-for-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 --
-- Software Foundation; either version 2, or (at your option) any later --
-- version. ASIS-for-GNAT is distributed in the hope that it will be use- --
-- ful, but WITHOUT ANY WARRANTY; without even the implied warranty of MER- --
-- CHANTABILITY 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 ASIS-for-GNAT; see file --
-- COPYING. If not, write to the Free Software Foundation, 51 Franklin --
-- Street, Fifth Floor, Boston, MA 02110-1301, USA. --
-- --
-- --
-- --
-- --
-- --
-- --
-- --
-- --
-- ASIS-for-GNAT was originally developed by the ASIS-for-GNAT team at the --
-- Software Engineering Laboratory of the Swiss Federal Institute of --
-- Technology (LGL-EPFL) in Lausanne, Switzerland, in cooperation with the --
-- Scientific Research Computer Center of Moscow State University (SRCC --
-- MSU), Russia, with funding partially provided by grants from the Swiss --
-- National Science Foundation and the Swiss Academy of Engineering --
-- Sciences. ASIS-for-GNAT is now maintained by AdaCore --
-- (http://www.adacore.com). --
-- --
------------------------------------------------------------------------------
-- This package contains the utility routines used for calling the GNAT
-- compiler from inside the ASIS implementation routines to create a tree
-- file. These routines may be used by ASIS-based tools as well. The idea is
-- to call GNAT in a black-box manner. The current version of this package
-- borrows most of the ideas and the code patterns from the body of the
-- GNAT Make package (which defines the gnatmake-related routines).
-- Unfortunately, GNAT do not provide the public interface to these
-- routines, so we simply have copied the code from make.adb with some
-- modifications.
--
-- This package also contains the routine which reads the tree file with
-- checking the GNAT-ASIS versions compartibility.
with Ada.Calendar; use Ada.Calendar;
with A4G.A_Types; use A4G.A_Types;
with A4G.A_Debug;
with GNAT.OS_Lib; use GNAT.OS_Lib;
with Types; use Types;
package A4G.GNAT_Int is
-----------------------------------
-- Compiler Variables & Routines --
-----------------------------------
Nul_Argument_List : constant Argument_List (1 .. 0) := (others => null);
-- The flags listed below are used to form the appropriate GNAT or
-- gnatmake call to create the tree file
Comp_Flag : constant String_Access := new String'("-c");
GNAT_Flag : constant String_Access := new String'("-gnatg");
GNAT_Flag_ct : constant String_Access := new String'("-gnatct");
GNAT_Flag_t : constant String_Access := new String'("-gnatt");
GNAT_Flag_ws : constant String_Access := new String'("-gnatws");
GNAT_Flag_yN : constant String_Access := new String'("-gnatyN");
GNAT_Flag_05 : constant String_Access := new String'("-gnat05");
GCC_Flag_X : constant String_Access := new String'("-x");
GCC_Par_Ada : constant String_Access := new String'("ada");
GCC_Flag_o : constant String_Access := new String'("-o");
GNATMAKE_Flag_q : constant String_Access := new String'("-q");
GNATMAKE_Flag_u : constant String_Access := new String'("-u");
GNATMAKE_Flag_f : constant String_Access := new String'("-f");
GNATMAKE_Flag_cargs : constant String_Access := new String'("-cargs");
-- Display_Executed_Programs : Boolean renames A4G.A_Debug.Debug_Mode;
-- Set to True if name of commands should be output on stderr.
-- Now this flag is toughtly binded with the flag setting the
-- ASIS Debug Mode. Is it a good decision?
function Execute
(Program : String_Access;
Args : Argument_List;
Compiler_Out : String := "";
Display_Call : Boolean := A4G.A_Debug.Debug_Mode)
return Boolean;
-- Executes Program. If the program is not set (the actual for Program is
-- null), executes the gcc command Args contains the arguments to be passed
-- to Program. If the program is executed successfully True is returned.
--
-- If Compiler_Out is a non-empty string, this string is treated as the
-- name of a text file to redirect the compiler output into (if the file
-- does not exist, it is created). Othervise the compiler output is
-- sent to Stderr.
--
-- If Display_Call is ON, outputs into Stderr the command used to execure
-- Program.
procedure Create_Tree (Source_File : String_Access;
Context : Context_Id;
Is_Predefined : Boolean;
Success : out Boolean);
-- Tries to create the tree output file for the given source file
-- in the context of a given Context. Uses the "standard" GNAT
-- installation to do this
procedure Tree_In_With_Version_Check
(Desc : File_Descriptor;
Cont : Context_Id;
Success : out Boolean);
-- Desc is the file descriptor for the file containing the tree file
-- created by the compiler, Cont is the Id of the Context this tree is
-- supposed to belong to. This routine reads in the content of the tree
-- file and makes the GNAT-ASIS version check as a part of tree reading.
-- If the version check fails or if any error corresponding to the problems
-- with the expected tree format is detected, Program_Error is raised with
-- the exception message "Inconsistent versions of GNAT and ASIS". If
-- the tree can not be read in because of any other reason (for example,
-- it is not compile-only), the Success parameter is set OFF and the
-- continuation depends on the Context parameters. If the tree has been
-- read in successfully and if it is compile-only, Success is set ON.
--
-- Before calling this procedure, a caller should put the name of the tree
-- file to read into A_Name_Buffer.
--
-- NOTE: the procedure always closes Desc before returning. Closing it
-- the second time is erroneous.
function A_Time (T : Time_Stamp_Type)
return Time;
-- Converts GNAT file time stamp into the corresponding value
-- of Asis_Time.
end A4G.GNAT_Int;
|
AaronC98/PlaneSystem | Ada | 7,832 | ads | ------------------------------------------------------------------------------
-- Ada Web Server --
-- --
-- Copyright (C) 2005-2017, AdaCore --
-- --
-- This library is free software; you can redistribute it and/or modify --
-- it under terms of the GNU General Public License as published by the --
-- Free Software Foundation; either version 3, or (at your option) any --
-- later version. This library is distributed in the hope that it will be --
-- useful, but WITHOUT ANY WARRANTY; without even the implied warranty of --
-- MERCHANTABILITY or FITNESS FOR A PARTICULAR PURPOSE. --
-- --
-- --
-- --
-- --
-- --
-- You should have received a copy of the GNU General Public License and --
-- a copy of the GCC Runtime Library Exception along with this program; --
-- see the files COPYING3 and COPYING.RUNTIME respectively. If not, see --
-- <http://www.gnu.org/licenses/>. --
-- --
-- --
-- --
-- --
-- --
-- --
-- --
------------------------------------------------------------------------------
pragma Ada_2012;
with AWS.Client;
with AWS.Response;
with AWS.Status;
package AWS.Client.HTTP_Utils is
Connection_Error : exception renames Client.Connection_Error;
Protocol_Error : exception renames Client.Protocol_Error;
Debug_On : Boolean := False;
procedure Decrement_Authentication_Attempt
(Connection : in out HTTP_Connection;
Counter : in out Auth_Attempts_Count;
Over : out Boolean);
-- Counts the authentication attempts. Over is set to True when
-- authentication attempts are over.
procedure Set_Authentication
(Auth : out Authentication_Type;
User : String;
Pwd : String;
Mode : Authentication_Mode);
-- Internal procedure to set authentication parameters
procedure Parse_Header
(Connection : in out HTTP_Connection;
Answer : out Response.Data;
Keep_Alive : out Boolean);
-- Read server answer and set corresponding variable with the value
-- read. Most of the fields are ignored right now.
procedure Connect (Connection : in out HTTP_Connection);
-- Open the connection. Raises Connection_Error if it is not possible to
-- establish the connection. In this case all resources are released and
-- Connection.Opened is set to False.
procedure Disconnect (Connection : in out HTTP_Connection);
-- Close connection. Further use is not possible
procedure Get_Response
(Connection : in out HTTP_Connection;
Result : out Response.Data;
Get_Body : Boolean := True);
-- Receives response from server for GET and POST and HEAD commands.
-- If Get_Body is set then the message body will be read.
procedure Read_Body
(Connection : in out HTTP_Connection;
Result : out Response.Data;
Store : Boolean);
-- Read message body and store it into Result if Store is True otherwise
-- the content is discarded.
procedure Open_Send_Common_Header
(Connection : in out HTTP_Connection;
Method : String;
URI : String;
Headers : Header_List := Empty_Header_List);
-- Open the the Connection if it is not open. Send the common HTTP headers
-- for all requests like the proxy, authentication, user agent, host.
procedure Send_Authentication_Header
(Connection : in out HTTP_Connection;
Token : String;
Data : in out Authentication_Type;
URI : String;
Method : String);
-- Send the authentication header for proxy or for server
procedure Internal_Post
(Connection : in out HTTP_Connection;
Result : out Response.Data;
Data : Stream_Element_Array;
URI : String;
SOAPAction : String;
Content_Type : String;
Attachments : Attachment_List;
Headers : Header_List := Empty_Header_List);
-- Common base routine for Post and SOAP_Post routines
procedure Internal_Post_Without_Attachment
(Connection : in out HTTP_Connection;
Result : out Response.Data;
Data : Stream_Element_Array;
URI : String;
SOAPAction : String;
Content_Type : String;
Headers : Header_List := Empty_Header_List);
-- Only used by Internal_Post
procedure Internal_Post_With_Attachment
(Connection : in out HTTP_Connection;
Result : out Response.Data;
Data : Stream_Element_Array;
URI : String;
SOAPAction : String;
Content_Type : String;
Attachments : Attachment_List;
Headers : Header_List := Empty_Header_List);
-- Only used by Internal_Post
procedure Send_Common_Post
(Connection : in out HTTP_Connection;
Data : Stream_Element_Array;
URI : String;
SOAPAction : String;
Content_Type : String;
Headers : Header_List := Empty_Header_List);
-- Send to the server only a POST request with Data
-- and common headers, using a Connection.
type Method_Kind is new Status.Request_Method
with Dynamic_Predicate => Method_Kind in GET | HEAD | PUT | DELETE;
No_Data : constant Stream_Element_Array := (1 .. 0 => 0);
procedure Send_Request
(Connection : in out HTTP_Connection;
Kind : Method_Kind;
Result : out Response.Data;
URI : String;
Data : Stream_Element_Array := No_Data;
Headers : Header_List := Empty_Header_List);
-- Send to the server only a POST request with Data
-- and common headers, using a Connection.
procedure Send_Header
(Sock : Net.Socket_Type'Class;
Data : String)
with Inline;
-- Send header Data to socket and call Debug_Message
procedure Send_Header
(Sock : Net.Socket_Type'Class;
Header : String;
Constructor : not null access function (Value : String) return String;
Value : String;
Headers : Header_List)
with Inline;
-- Send header to socket if this header is not present in Headers. The
-- actual header data is given by the constructor. Call Debug_Message if
-- header is sent.
procedure Set_HTTP_Connection
(HTTP_Client : in out HTTP_Connection;
Sock_Ptr : Net.Socket_Access);
-- Initialize HTTP_Client by positioning the socket used as Sock_Ptr
function Value (V : String) return Unbounded_String;
-- Returns V as an Unbounded_String if V is not the empty string
-- otherwise it returns Null_Unbounded_String.
end AWS.Client.HTTP_Utils;
|
optikos/oasis | Ada | 2,903 | ads | -- Copyright (c) 2019 Maxim Reznik <[email protected]>
--
-- SPDX-License-Identifier: MIT
-- License-Filename: LICENSE
-------------------------------------------------------------
with Program.Elements.Declarations;
with Program.Lexical_Elements;
with Program.Elements.Defining_Identifiers;
with Program.Elements.Aspect_Specifications;
with Program.Element_Vectors;
with Program.Elements.Identifiers;
package Program.Elements.Protected_Body_Declarations is
pragma Pure (Program.Elements.Protected_Body_Declarations);
type Protected_Body_Declaration is
limited interface and Program.Elements.Declarations.Declaration;
type Protected_Body_Declaration_Access is
access all Protected_Body_Declaration'Class with Storage_Size => 0;
not overriding function Name
(Self : Protected_Body_Declaration)
return not null Program.Elements.Defining_Identifiers
.Defining_Identifier_Access is abstract;
not overriding function Aspects
(Self : Protected_Body_Declaration)
return Program.Elements.Aspect_Specifications
.Aspect_Specification_Vector_Access is abstract;
not overriding function Protected_Operations
(Self : Protected_Body_Declaration)
return not null Program.Element_Vectors.Element_Vector_Access
is abstract;
not overriding function End_Name
(Self : Protected_Body_Declaration)
return Program.Elements.Identifiers.Identifier_Access is abstract;
type Protected_Body_Declaration_Text is limited interface;
type Protected_Body_Declaration_Text_Access is
access all Protected_Body_Declaration_Text'Class with Storage_Size => 0;
not overriding function To_Protected_Body_Declaration_Text
(Self : aliased in out Protected_Body_Declaration)
return Protected_Body_Declaration_Text_Access is abstract;
not overriding function Protected_Token
(Self : Protected_Body_Declaration_Text)
return not null Program.Lexical_Elements.Lexical_Element_Access
is abstract;
not overriding function Body_Token
(Self : Protected_Body_Declaration_Text)
return not null Program.Lexical_Elements.Lexical_Element_Access
is abstract;
not overriding function With_Token
(Self : Protected_Body_Declaration_Text)
return Program.Lexical_Elements.Lexical_Element_Access is abstract;
not overriding function Is_Token
(Self : Protected_Body_Declaration_Text)
return not null Program.Lexical_Elements.Lexical_Element_Access
is abstract;
not overriding function End_Token
(Self : Protected_Body_Declaration_Text)
return not null Program.Lexical_Elements.Lexical_Element_Access
is abstract;
not overriding function Semicolon_Token
(Self : Protected_Body_Declaration_Text)
return not null Program.Lexical_Elements.Lexical_Element_Access
is abstract;
end Program.Elements.Protected_Body_Declarations;
|
stcarrez/ada-util | Ada | 3,643 | ads | -----------------------------------------------------------------------
-- util-encodes-tests - Test for encoding
-- Copyright (C) 2009 - 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.
-----------------------------------------------------------------------
with Util.Tests;
package Util.Encoders.Tests is
procedure Add_Tests (Suite : in Util.Tests.Access_Test_Suite);
type Test is new Util.Tests.Test with null record;
procedure Test_Hex (T : in out Test);
procedure Test_Base64_Encode (T : in out Test);
procedure Test_Base64_Decode (T : in out Test);
procedure Test_Base64_URL_Encode (T : in out Test);
procedure Test_Base64_URL_Decode (T : in out Test);
procedure Test_Base32_Encode (T : in out Test);
procedure Test_Base32_Decode (T : in out Test);
procedure Test_Encoder (T : in out Test;
C : in Util.Encoders.Encoder;
D : in Util.Encoders.Decoder);
procedure Test_Base64_Benchmark (T : in out Test);
procedure Test_SHA1_Encode (T : in out Test);
procedure Test_SHA256_Encode (T : in out Test);
-- Benchmark test for SHA1
procedure Test_SHA1_Benchmark (T : in out Test);
-- Test HMAC-SHA1
procedure Test_HMAC_SHA1_RFC2202_T1 (T : in out Test);
procedure Test_HMAC_SHA1_RFC2202_T2 (T : in out Test);
procedure Test_HMAC_SHA1_RFC2202_T3 (T : in out Test);
procedure Test_HMAC_SHA1_RFC2202_T4 (T : in out Test);
procedure Test_HMAC_SHA1_RFC2202_T5 (T : in out Test);
procedure Test_HMAC_SHA1_RFC2202_T6 (T : in out Test);
procedure Test_HMAC_SHA1_RFC2202_T7 (T : in out Test);
procedure Test_HMAC_SHA1_Sign (T : in out Test);
-- Test HMAC-SHA256
procedure Test_HMAC_SHA256_RFC4231_T1 (T : in out Test);
procedure Test_HMAC_SHA256_RFC4231_T2 (T : in out Test);
procedure Test_HMAC_SHA256_RFC4231_T3 (T : in out Test);
procedure Test_HMAC_SHA256_RFC4231_T4 (T : in out Test);
procedure Test_HMAC_SHA256_RFC4231_T5 (T : in out Test);
procedure Test_HMAC_SHA256_RFC4231_T6 (T : in out Test);
procedure Test_HMAC_SHA256_RFC4231_T7 (T : in out Test);
-- Test encoding leb128.
procedure Test_LEB128 (T : in out Test);
-- Test encoding leb128 + base64url.
procedure Test_Base64_LEB128 (T : in out Test);
-- Test encrypt and decrypt operations.
procedure Test_AES (T : in out Test);
-- Test encrypt and decrypt operations.
procedure Test_Encrypt_Decrypt_Secret (T : in out Test);
procedure Test_Encrypt_Decrypt_Secret_OFB (T : in out Test);
procedure Test_Encrypt_Decrypt_Secret_CFB (T : in out Test);
procedure Test_Encrypt_Decrypt_Secret_CTR (T : in out Test);
-- Test Decode Quoted-Printable encoding.
procedure Test_Decode_Quoted_Printable (T : in out Test);
-- Test the percent URI encoding.
procedure Test_Encode_URI (T : in out Test);
-- Test the HOTP method.
procedure Test_HMAC_HOTP (T : in out Test);
-- Test the Decode_Key function.
procedure Test_Decode_Key (T : in out Test);
end Util.Encoders.Tests;
|
pombredanne/ravenadm | Ada | 35,892 | adb | -- This file is covered by the Internet Software Consortium (ISC) License
-- Reference: ../License.txt
with Definitions; use Definitions;
with Ada.Text_IO;
with Ada.Exceptions;
with Ada.Directories;
with File_Operations;
with INI_File_Manager;
with Parameters;
with Unix;
package body Options_Dialog is
package FOP renames File_Operations;
package IFM renames INI_File_Manager;
package TIO renames Ada.Text_IO;
package DIR renames Ada.Directories;
package EX renames Ada.Exceptions;
--------------------------------------------------------------------------------------------
-- launch_dialog
--------------------------------------------------------------------------------------------
function launch_dialog (specification : in out PSP.Portspecs) return Boolean
is
begin
num_groups := 0;
num_options := 0;
arrow_points := 1;
if not Start_Curses_Mode then
TIO.Put_Line ("Failed to enter curses modes");
return False;
end if;
if not TIC.Has_Colors or else not establish_colors then
Return_To_Text_Mode;
TIO.Put_Line ("The TERM environment variable value (" & Unix.env_variable_value ("TERM")
& ") does not support colors.");
return False;
end if;
if Natural (TIC.Lines) < 10 then
Return_To_Text_Mode;
TIO.Put_Line ("At " & HT.int2str (Natural (TIC.Lines)) &
" lines tall, the curses window is too short to function correctly.");
return False;
end if;
begin
TIC.Set_Echo_Mode (False);
TIC.Set_Raw_Mode (True);
TIC.Set_Cbreak_Mode (True);
TIC.Set_Cursor_Visibility (Visibility => cursor_vis);
exception
when issue : TIC.Curses_Exception =>
TIO.Put_Line ("Unknown curses issues: " & EX.Exception_Message (issue));
Return_To_Text_Mode;
return False;
end;
if not launch_keymenu_zone or else
not launch_dialog_zone
then
terminate_dialog;
return False;
end if;
setup_parameters (specification);
draw_static_keymenu;
handle_user_commands;
terminate_dialog;
return True;
end launch_dialog;
--------------------------------------------------------------------------------------------
-- establish_colors
--------------------------------------------------------------------------------------------
function establish_colors return Boolean is
begin
TIC.Start_Color;
begin
TIC.Init_Pair (TIC.Color_Pair (1), TIC.White, TIC.Black);
TIC.Init_Pair (TIC.Color_Pair (2), TIC.Cyan, TIC.Black);
TIC.Init_Pair (TIC.Color_Pair (3), TIC.Green, TIC.Black);
TIC.Init_Pair (TIC.Color_Pair (4), TIC.Black, TIC.Black);
TIC.Init_Pair (TIC.Color_Pair (5), TIC.Blue, TIC.Cyan);
TIC.Init_Pair (TIC.Color_Pair (6), TIC.Yellow, TIC.Black);
TIC.Init_Pair (TIC.Color_Pair (7), TIC.Magenta, TIC.Black);
TIC.Init_Pair (TIC.Color_Pair (8), TIC.Black, TIC.White);
TIC.Init_Pair (TIC.Color_Pair (9), TIC.Magenta, TIC.White);
TIC.Init_Pair (TIC.Color_Pair (10), TIC.Blue, TIC.White);
TIC.Init_Pair (TIC.Color_Pair (11), TIC.Red, TIC.White);
exception
when TIC.Curses_Exception => return False;
end;
c_standard := TIC.Color_Pair (1);
c_key_desc := TIC.Color_Pair (2);
c_title := TIC.Color_Pair (3);
c_trimmings := TIC.Color_Pair (4);
c_optbox_title := TIC.Color_Pair (5);
c_group_text := TIC.Color_Pair (11);
c_group_trim := TIC.Color_Pair (8);
c_letters := TIC.Color_Pair (9);
c_options := TIC.Color_Pair (10);
c_inv_gray := TIC.Color_Pair (8);
c_tick_on := TIC.Color_Pair (8);
c_tick_delta := TIC.Color_Pair (11);
c_arrow := TIC.Color_Pair (6);
return True;
end establish_colors;
--------------------------------------------------------------------------------------------
-- Start_Curses_Mode
--------------------------------------------------------------------------------------------
function Start_Curses_Mode return Boolean is
begin
TIC.Init_Screen;
return True;
exception
when TIC.Curses_Exception => return False;
end Start_Curses_Mode;
--------------------------------------------------------------------------------------------
-- Return_To_Text_Mode
--------------------------------------------------------------------------------------------
procedure Return_To_Text_Mode is
begin
TIC.End_Windows;
exception
when TIC.Curses_Exception => null;
end Return_To_Text_Mode;
--------------------------------------------------------------------------------------------
-- zone_window
--------------------------------------------------------------------------------------------
function zone_window (zone : zones) return TIC.Window is
begin
case zone is
when keymenu => return zone_keymenu;
when dialog => return zone_dialog;
end case;
end zone_window;
--------------------------------------------------------------------------------------------
-- Refresh_Zone
--------------------------------------------------------------------------------------------
procedure Refresh_Zone (zone : zones) is
begin
TIC.Refresh (Win => zone_window (zone));
exception
when TIC.Curses_Exception => null;
end Refresh_Zone;
------------------------------------------------------------------------
-- Scrawl
------------------------------------------------------------------------
procedure Scrawl (zone : zones;
information : TIC.Attributed_String;
at_line : TIC.Line_Position;
at_column : TIC.Column_Position := 0) is
begin
TIC.Add (Win => zone_window (zone),
Line => at_line,
Column => at_column,
Str => information,
Len => information'Length);
exception
when TIC.Curses_Exception => null;
end Scrawl;
--------------------------------------------------------------------------------------------
-- launch_keymenu_zone
--------------------------------------------------------------------------------------------
function launch_keymenu_zone return Boolean is
begin
zone_keymenu := TIC.Create (Number_Of_Lines => 4,
Number_Of_Columns => app_width,
First_Line_Position => 0,
First_Column_Position => 0);
return True;
exception
when TIC.Curses_Exception => return False;
end launch_keymenu_zone;
--------------------------------------------------------------------------------------------
-- launch_dialog_zone
--------------------------------------------------------------------------------------------
function launch_dialog_zone return Boolean
is
-- 56 limit comes from 26x3 + 1 (header) + 1x2 (margin) + 1 footer
-- A .. Z + a .. Z + worst case of 26 2-member groups
begin
zone_dialog := TIC.Create (Number_Of_Lines => dialog_height,
Number_Of_Columns => app_width,
First_Line_Position => 4,
First_Column_Position => 0);
return True;
exception
when TIC.Curses_Exception => return False;
end launch_dialog_zone;
--------------------------------------------------------------------------------------------
-- terminate_dialog
--------------------------------------------------------------------------------------------
procedure terminate_dialog
is
ok : Boolean := True;
begin
-- zone_window can't be used because Delete will modify Win variable
begin
TIC.Delete (Win => zone_keymenu);
TIC.Delete (Win => zone_dialog);
exception
when TIC.Curses_Exception =>
ok := False;
end;
Return_To_Text_Mode;
if not ok then
TIO.Put_Line ("Saw error during termination");
end if;
end terminate_dialog;
--------------------------------------------------------------------------------------------
-- custom_message
--------------------------------------------------------------------------------------------
function custom_message (message : String;
attribute : TIC.Character_Attribute_Set;
pen_color : TIC.Color_Pair) return TIC.Attributed_String
is
product : TIC.Attributed_String (1 .. message'Length);
pindex : Positive := 1;
begin
for index in message'Range loop
product (pindex) := (Attr => attribute,
Color => pen_color,
Ch => message (index));
pindex := pindex + 1;
end loop;
return product;
end custom_message;
--------------------------------------------------------------------------------------------
-- touch_up
--------------------------------------------------------------------------------------------
procedure touch_up (ATS : in out TIC.Attributed_String;
From_index : Positive;
length : Positive;
attribute : TIC.Character_Attribute_Set;
pen_color : TIC.Color_Pair)
is
begin
for index in From_index .. From_index - 1 + length loop
ATS (index).Attr := attribute;
ATS (index).Color := pen_color;
end loop;
end touch_up;
--------------------------------------------------------------------------------------------
-- colorize_groups
--------------------------------------------------------------------------------------------
function colorize_groups (textdata : String) return TIC.Attributed_String
is
product : TIC.Attributed_String (1 .. textdata'Length);
pindex : Positive := 1;
endmarker : Positive := textdata'Last - 3;
begin
if textdata'Length < 8 then
return product; -- should never happen
end if;
for index in textdata'First .. textdata'First + 2 loop
product (pindex) := (normal, c_standard, textdata (index));
pindex := pindex + 1;
end loop;
for index in textdata'First + 3 .. endmarker loop
if textdata (index) = '-' then
product (pindex) := (normal, c_group_trim, textdata (index));
else
product (pindex) := (normal, c_group_text, textdata (index));
end if;
pindex := pindex + 1;
end loop;
for index in endmarker + 1 .. textdata'Last loop
product (pindex) := (normal, c_standard, textdata (index));
pindex := pindex + 1;
end loop;
return product;
end colorize_groups;
--------------------------------------------------------------------------------------------
-- colorize_groups
--------------------------------------------------------------------------------------------
function colorize_option (textdata : String) return TIC.Attributed_String
is
product : TIC.Attributed_String (1 .. textdata'Length);
pindex : Positive := 1;
endmarker : Positive := textdata'Last - 3;
begin
if textdata'Length < 8 then
return product; -- should never happen
end if;
for index in textdata'First .. textdata'First + 2 loop
product (pindex) := (bright, c_arrow, textdata (index));
pindex := pindex + 1;
end loop;
-- Menu letter, 2 characters
for index in textdata'First + 3 .. textdata'First + 4 loop
product (pindex) := (normal, c_letters, textdata (index));
pindex := pindex + 1;
end loop;
-- Tickbox (5 characters)
for index in textdata'First + 5 .. textdata'First + 9 loop
product (pindex) := (normal, c_inv_gray, textdata (index));
pindex := pindex + 1;
end loop;
-- Option identifier (14 characters)
for index in textdata'First + 10 .. textdata'First + 24 loop
product (pindex) := (normal, c_options, textdata (index));
pindex := pindex + 1;
end loop;
-- Option description (everything else)
for index in textdata'First + 25 .. endmarker loop
product (pindex) := (normal, c_inv_gray, textdata (index));
pindex := pindex + 1;
end loop;
for index in endmarker + 1 .. textdata'Last loop
product (pindex) := (normal, c_standard, textdata (index));
pindex := pindex + 1;
end loop;
return product;
end colorize_option;
--------------------------------------------------------------------------------------------
-- draw_static_keymenu
--------------------------------------------------------------------------------------------
procedure draw_static_keymenu
is
procedure key_label (S : String; col : TIC.Column_Position; row : TIC.Line_Position);
subtype full_line is String (1 .. appline_max);
msg1 : full_line := " Save option settings " &
" move highlight arrow ";
msg2 : full_line := " Reset to current values " &
" Toggle highlighted option setting ";
msg3 : full_line := " Reset to default values " &
" Toggle associated option setting ";
msg4 : full_line := (others => '#');
line1 : constant appline := custom_message (msg1, bright, c_key_desc);
line2 : constant appline := custom_message (msg2, bright, c_key_desc);
line3 : constant appline := custom_message (msg3, bright, c_key_desc);
line4 : constant appline := custom_message (msg4, bright, c_trimmings);
title : constant String := title_bar_contents;
tit_x : constant TIC.Column_Position := index_to_center (title);
procedure key_label (S : String; col : TIC.Column_Position; row : TIC.Line_Position)
is
info : TIC.Attributed_String := custom_message (S, bright, c_standard);
begin
Scrawl (keymenu, info, row, col);
end key_label;
begin
Scrawl (keymenu, line1, 0);
Scrawl (keymenu, line2, 1);
Scrawl (keymenu, line3, 2);
Scrawl (keymenu, line4, 3);
key_label ("F/1:", 2, 0); key_label ("arrows:", 36, 0);
key_label ("F/2:", 2, 1); key_label ("space:", 37, 1);
key_label ("F/3:", 2, 2); key_label ("A .. " & last_alphakey & ":", 36, 2);
Scrawl (keymenu, custom_message (title, bright, c_title), 3, tit_x);
end draw_static_keymenu;
--------------------------------------------------------------------------------------------
-- setup_parameters
--------------------------------------------------------------------------------------------
procedure setup_parameters (specification : PSP.Portspecs)
is
function str2bool (value : String) return Boolean;
function button (linenum : Natural) return String;
function str2behavior (value : String) return group_type;
function format (value : String; size : Positive) return String;
function group_title (value : String; gtype : group_type) return String;
block : String := specification.option_block_for_dialog;
markers : HT.Line_Markers;
lastgrp : HT.Text;
linenum : Natural := 0;
gcount : Natural := 0;
function str2bool (value : String) return Boolean is
begin
return (value = "1");
end str2bool;
function str2behavior (value : String) return group_type is
begin
if value = "RESTR" then
return restrict;
elsif value = "RADIO" then
return radio;
else
return unlimited;
end if;
end str2behavior;
function button (linenum : Natural) return String
is
letter : Character;
begin
if linenum > 26 then
letter := Character'Val (Character'Pos ('a') - 27 + linenum);
else
letter := Character'Val (Character'Pos ('A') - 1 + linenum);
end if;
return letter & " ";
end button;
function format (value : String; size : Positive) return String
is
slate : String (1 .. size) := (others => ' ');
begin
if value'Length > size then
slate := value (value'First .. value'First - 1 + size);
else
slate (1 .. value'Length) := value;
end if;
return slate;
end format;
function group_title (value : String; gtype : group_type) return String is
begin
case gtype is
when radio => return "[ " & value & " (exactly 1) ]";
when restrict => return "[ " & value & " (minimum 1) ]";
when unlimited => return "[ " & value & " ]";
end case;
end group_title;
begin
num_std_options := specification.get_list_length (PSP.sp_opts_standard);
if num_std_options < 27 then
last_alphakey := Character'Val (Character'Pos ('A') + num_std_options - 1);
else
last_alphakey := Character'Val (Character'Pos ('a') + num_std_options - 27);
end if;
port_namebase := HT.SUS (specification.get_field_value (PSP.sp_namebase));
port_sdesc := HT.SUS (specification.get_tagline (variant_standard));
port_version := HT.SUS (specification.get_field_value (PSP.sp_version));
HT.initialize_markers (block, markers);
loop
exit when not HT.next_line_present (block, markers);
declare
line : constant String := HT.extract_line (block, markers);
grid : constant String := HT.specific_field (line, 1, ":");
group : constant String := HT.specific_field (line, 3, ":");
gtype : constant group_type := str2behavior (HT.specific_field (line, 2, ":"));
title : constant String := group_title (group, gtype);
center : constant Natural := ((optentry'Length - title'Length) / 2) + 1;
cend : constant Natural := center + title'Length - 1;
begin
if not HT.equivalent (lastgrp, grid) then
-- new group
num_groups := num_groups + 1;
linenum := linenum + 1;
formatted_grps (num_groups).relative_vert := linenum;
formatted_grps (num_groups).template := (others => '-');
formatted_grps (num_groups).behavior := gtype;
formatted_grps (num_groups).template (center .. cend) := title;
lastgrp := HT.SUS (grid);
gcount := gcount + 1;
end if;
linenum := linenum + 1;
num_options := num_options + 1;
declare
fopt : optentry_rec renames formatted_opts (num_options);
begin
fopt.relative_vert := linenum;
fopt.default_value := str2bool (HT.specific_field (line, 5, ":"));
fopt.current_value := str2bool (HT.specific_field (line, 6, ":"));
fopt.ticked_value := fopt.current_value;
fopt.member_group := gcount;
fopt.template := button (num_options) & "[ ] " &
format (HT.specific_field (line, 4, ":"), 14) & " " &
format (HT.specific_field (line, 7, ":"), 50);
end;
end;
end loop;
end setup_parameters;
--------------------------------------------------------------------------------------------
-- index_to_center
--------------------------------------------------------------------------------------------
function index_to_center (display_text : String) return TIC.Column_Position
is
-- We want at least "- " to start and " -" to end, so if length of display_text is
-- greater than appwidth minus 4 set exception. It should be handled earlier
max : Natural := Natural (app_width) - 4;
res : Integer;
begin
if display_text'Length > max then
raise dev_error with "display text is too long";
end if;
-- column positions start with "0"
res := (Natural (app_width) - display_text'Length) / 2;
return TIC.Column_Position (res);
end index_to_center;
--------------------------------------------------------------------------------------------
-- title_bar_contents
--------------------------------------------------------------------------------------------
function title_bar_contents return String
is
-- We want at least "- " to start and " -" to end, so the max length is
-- appwidth minus 4. We just truncate anything over that.
max : Natural := Natural (app_width) - 4;
raw : String := " " & HT.USS (port_sdesc) & " ";
begin
if raw'Length < max then
return raw;
else
-- Since sdesc is limited to 50 chars, this should be impossible
return raw (raw'First .. raw'First + max - 1);
end if;
end title_bar_contents;
--------------------------------------------------------------------------------------------
-- handle_user_commands
--------------------------------------------------------------------------------------------
procedure handle_user_commands
is
KeyCode : TIC.Real_Key_Code;
Key_Num1 : constant TIC.Key_Code := Character'Pos ('1');
Key_Num2 : constant TIC.Key_Code := Character'Pos ('2');
Key_Num3 : constant TIC.Key_Code := Character'Pos ('3');
Key_Num4 : constant TIC.Key_Code := Character'Pos ('4');
Key_Space : constant TIC.Key_Code := Character'Pos (' ');
Key_Option_01 : constant TIC.Key_Code := Character'Pos ('A');
Key_Option_26 : constant TIC.Key_Code := Character'Pos ('Z');
Key_Option_27 : constant TIC.Key_Code := Character'Pos ('a');
Key_Option_52 : constant TIC.Key_Code := Character'Pos ('z');
Key_Option_Last : constant TIC.Key_Code := Character'Pos (last_alphakey);
option_index : Positive;
use type TIC.Real_Key_Code;
begin
TIC.Set_KeyPad_Mode (Win => zone_keymenu, SwitchOn => True);
loop
draw_static_dialog;
populate_dialog;
Refresh_Zone (keymenu);
Refresh_Zone (dialog);
KeyCode := TIC.Get_Keystroke (zone_keymenu);
case KeyCode is
when TIC.Key_Cursor_Up | TIC.Key_Cursor_Left =>
if arrow_points > 1 then
arrow_points := arrow_points - 1;
end if;
when TIC.Key_Cursor_Down | TIC.Key_Cursor_Right =>
if arrow_points < num_std_options then
arrow_points := arrow_points + 1;
end if;
when TIC.Key_F1 | Key_Num1 =>
save_options;
exit;
when TIC.Key_F2 | Key_Num2 =>
-- Reset to current
for x in 1 .. num_std_options loop
formatted_opts (x).ticked_value := formatted_opts (x).current_value;
end loop;
when TIC.Key_F3 | Key_Num3 =>
-- Reset to default
for x in 1 .. num_std_options loop
formatted_opts (x).ticked_value := formatted_opts (x).default_value;
end loop;
when Key_Option_01 .. Key_Option_26 =>
if KeyCode <= Key_Option_Last then
option_index := Positive (KeyCode - Key_Option_01 + 1);
toggle_option (option_index);
end if;
when Key_Option_27 .. Key_Option_52 =>
if num_std_options < 27 then
option_index := Positive (KeyCode - Key_Option_27 + 1);
else
option_index := Positive (KeyCode - Key_Option_01 + 1);
end if;
toggle_option (option_index);
when Key_Space =>
toggle_option (arrow_points);
when others => null;
end case;
end loop;
end handle_user_commands;
--------------------------------------------------------------------------------------------
-- draw_static_dialog
--------------------------------------------------------------------------------------------
procedure draw_static_dialog
is
function option_content (index : Positive) return String;
viewheight : Integer := Integer (TIC.Lines) - 4;
full_length : Natural := num_groups + num_options + 1;
S4 : constant String := " ";
SARROW : constant String := " > ";
blank_line : String (1 .. appline_max) := (others => ' ');
title_line : String := blank_line;
title_text : String := HT.USS (port_namebase) & "-" & HT.USS (port_version);
tcenter : Natural := Natural (index_to_center (title_text));
ATS_BLANK : appline := custom_message (blank_line, normal, c_standard);
ATS_FOOTER : appline := custom_message (blank_line, normal, c_optbox_title);
ATS_TITLE : appline;
scrollable : Boolean;
titlerow : constant Positive := 1;
function option_content (index : Positive) return String is
begin
if index = arrow_points then
return SARROW & formatted_opts (index).template & S4;
else
return S4 & formatted_opts (index).template & S4;
end if;
end option_content;
begin
offset := 0;
-- The zero row is alway left blank
scrollable := (full_length + titlerow > viewheight);
if scrollable then
declare
arrow_line : Positive := formatted_opts (arrow_points).relative_vert;
magic_line : Integer := viewheight - 4;
begin
-- Arrow can't go below 3 from the bottom
if arrow_line > magic_line then
offset := arrow_line - magic_line;
end if;
end;
end if;
Scrawl (dialog, ATS_BLANK, TIC.Line_Position (0));
if offset = 0 then
if title_text'Length > appline_max then
title_line :=
title_text (title_text'First .. title_text'First - 1 + Integer (app_width));
else
title_line (tcenter .. tcenter - 1 + title_text'Length) := title_text;
end if;
ATS_TITLE := custom_message (title_line, normal, c_optbox_title);
touch_up (ATS_TITLE, 1, 3, normal, c_standard);
touch_up (ATS_TITLE, 77, 3, normal, c_standard);
Scrawl (dialog, ATS_TITLE, TIC.Line_Position (titlerow));
end if;
for x in 1 .. num_options loop
declare
linepos : Integer := 1 + formatted_opts (x).relative_vert - offset;
ATS : TIC.Attributed_String := colorize_option (option_content (x));
begin
if linepos > titlerow then
Scrawl (dialog, ATS, TIC.Line_Position (linepos));
end if;
end;
end loop;
for x in 1 .. num_groups loop
declare
linepos : Integer := 1 + formatted_grps (x).relative_vert - offset;
ATS : TIC.Attributed_String := colorize_groups (S4 & formatted_grps (x).template & S4);
begin
if linepos > titlerow then
Scrawl (dialog, ATS, TIC.Line_Position (linepos));
end if;
end;
end loop;
touch_up (ATS_FOOTER, 1, 3, normal, c_standard);
touch_up (ATS_FOOTER, 77, 3, normal, c_standard);
Scrawl (dialog, ATS_FOOTER, TIC.Line_Position (titlerow + full_length - offset));
for x in titlerow + full_length - offset + 1 .. viewheight loop
Scrawl (dialog, ATS_BLANK, TIC.Line_Position (x));
end loop;
end draw_static_dialog;
--------------------------------------------------------------------------------------------
-- populate_dialog
--------------------------------------------------------------------------------------------
procedure populate_dialog
is
mark_x_on : TIC.Attributed_String (1 .. 3) := (1 => (normal, c_inv_gray, '['),
2 => (normal, c_tick_on, 'x'),
3 => (normal, c_inv_gray, ']'));
mark_x_delta : TIC.Attributed_String (1 .. 3) := (1 => (bright, c_tick_delta, '['),
2 => (normal, c_tick_delta, 'x'),
3 => (bright, c_tick_delta, ']'));
mark_blank : TIC.Attributed_String (1 .. 3) := (1 => (normal, c_inv_gray, '['),
2 => (normal, c_inv_gray, ' '),
3 => (normal, c_inv_gray, ']'));
mark_blank_delta : TIC.Attributed_String (1 .. 3) := (1 => (bright, c_tick_delta, '['),
2 => (normal, c_inv_gray, ' '),
3 => (bright, c_tick_delta, ']'));
fline : TIC.Line_Position;
vertical : Integer;
changed : Boolean;
begin
for x in 1 .. num_std_options loop
vertical := formatted_opts (x).relative_vert + 1 - offset;
if vertical > 1 then
fline := TIC.Line_Position (vertical);
changed := (formatted_opts (x).ticked_value /= formatted_opts (x).current_value);
if formatted_opts (x).ticked_value then
if changed then
Scrawl (dialog, mark_x_delta, fline, 6);
else
Scrawl (dialog, mark_x_on, fline, 6);
end if;
else
if changed then
Scrawl (dialog, mark_blank_delta, fline, 6);
else
Scrawl (dialog, mark_blank, fline, 6);
end if;
end if;
end if;
end loop;
end populate_dialog;
--------------------------------------------------------------------------------------------
-- toggle_option
--------------------------------------------------------------------------------------------
procedure toggle_option (option_index : Positive)
is
-- RADIO groups have to have at least one option selected. Selecting an unset member
-- of a radio group causes the other members to unset (should be only 1). Likewise
-- selected a set member normally has no effect.
-- For a restricted group, the last member cannot be unset.
gtype : group_type;
allowed : Boolean;
begin
if formatted_opts (option_index).member_group = 0 then
-- Ungrouped option, no restrictions
formatted_opts (option_index).ticked_value :=
not formatted_opts (option_index).ticked_value;
return;
end if;
gtype := formatted_grps (formatted_opts (option_index).member_group).behavior;
case gtype is
when unlimited =>
formatted_opts (option_index).ticked_value :=
not formatted_opts (option_index).ticked_value;
when radio =>
for x in 1 .. num_std_options loop
if formatted_opts (x).member_group = formatted_opts (option_index).member_group then
formatted_opts (x).ticked_value := (x = option_index);
end if;
end loop;
when restrict =>
if not formatted_opts (option_index).ticked_value then
-- It's being set on which is always permitted
formatted_opts (option_index).ticked_value := True;
else
-- It's being turned off, which is only allowed if there's another option
-- in the group set on.
allowed := False;
for x in 1 .. num_std_options loop
if formatted_opts (x).member_group = formatted_opts (option_index).member_group
then
if x /= option_index then
if formatted_opts (x).ticked_value then
allowed := True;
end if;
end if;
end if;
end loop;
if allowed then
formatted_opts (option_index).ticked_value := False;
end if;
end if;
end case;
end toggle_option;
--------------------------------------------------------------------------------------------
-- save_options
--------------------------------------------------------------------------------------------
procedure save_options
is
matches_defaults : Boolean := True;
section1 : constant String := "parameters";
section2 : constant String := "options";
dir_opt : constant String := HT.USS (Parameters.configuration.dir_options);
namebase : constant String := HT.USS (port_namebase);
cookie : constant String := dir_opt & "/defconf_cookies/" & namebase;
optfile : constant String := dir_opt & "/" & namebase;
optlist : HT.Text;
begin
for x in 1 .. num_std_options loop
if formatted_opts (x).ticked_value /= formatted_opts (x).default_value then
matches_defaults := False;
end if;
end loop;
if matches_defaults then
-- If mode is to record all options, we create an options file every when they
-- match the defaults, otherwise we remove existing files.
-- Cookies are not checked under "record_options
if Parameters.configuration.record_options then
if DIR.Exists (cookie) then
DIR.Delete_File (cookie);
end if;
else
if DIR.Exists (optfile) then
DIR.Delete_File (optfile);
end if;
if Parameters.configuration.batch_mode then
if DIR.Exists (cookie) then
DIR.Delete_File (cookie);
end if;
else
if not DIR.Exists (cookie) then
FOP.create_cookie (cookie);
end if;
end if;
return;
end if;
end if;
-- Create/overwrite options configure
IFM.clear_section_data;
for x in 1 .. num_std_options loop
declare
NAME : String := HT.trim (HT.substring (formatted_opts (x).template, 6, 51));
begin
IFM.insert_or_update (section => section2,
name => NAME,
value => HT.bool2str (formatted_opts (x).ticked_value));
if HT.IsBlank (optlist) then
optlist := HT.SUS (NAME);
else
HT.SU.Append (optlist, "," & NAME);
end if;
end;
end loop;
IFM.insert_or_update (section1, "namebase", namebase);
IFM.insert_or_update (section1, "version", HT.USS (port_version));
IFM.insert_or_update (section1, "available", HT.USS (optlist));
IFM.scribe_file (directory => dir_opt,
filename => namebase,
first_comment => "Option configuration for the " & namebase &
" standard variant");
end save_options;
end Options_Dialog;
|
SayCV/rtems-addon-packages | Ada | 3,731 | ads | ------------------------------------------------------------------------------
-- --
-- GNAT ncurses Binding Samples --
-- --
-- Sample.Menu_Demo.Handler --
-- --
-- S P E C --
-- --
------------------------------------------------------------------------------
-- Copyright (c) 1998-2003,2009 Free Software Foundation, Inc. --
-- --
-- Permission is hereby granted, free of charge, to any person obtaining a --
-- copy of this software and associated documentation files (the --
-- "Software"), to deal in the Software without restriction, including --
-- without limitation the rights to use, copy, modify, merge, publish, --
-- distribute, distribute with modifications, sublicense, and/or sell --
-- copies of the Software, and to permit persons to whom the Software is --
-- furnished to do so, subject to the following conditions: --
-- --
-- The above copyright notice and this permission notice shall be included --
-- in all copies or substantial portions of the Software. --
-- --
-- THE SOFTWARE IS PROVIDED "AS IS", WITHOUT WARRANTY OF ANY KIND, EXPRESS --
-- OR IMPLIED, INCLUDING BUT NOT LIMITED TO THE WARRANTIES OF --
-- MERCHANTABILITY, FITNESS FOR A PARTICULAR PURPOSE AND NONINFRINGEMENT. --
-- IN NO EVENT SHALL THE ABOVE COPYRIGHT HOLDERS BE LIABLE FOR ANY CLAIM, --
-- DAMAGES OR OTHER LIABILITY, WHETHER IN AN ACTION OF CONTRACT, TORT OR --
-- OTHERWISE, ARISING FROM, OUT OF OR IN CONNECTION WITH THE SOFTWARE OR --
-- THE USE OR OTHER DEALINGS IN THE SOFTWARE. --
-- --
-- Except as contained in this notice, the name(s) of the above copyright --
-- holders shall not be used in advertising or otherwise to promote the --
-- sale, use or other dealings in this Software without prior written --
-- authorization. --
------------------------------------------------------------------------------
-- Author: Juergen Pfeifer, 1996
-- Version Control
-- $Revision$
-- Binding Version 01.00
------------------------------------------------------------------------------
with Terminal_Interface.Curses;
use Terminal_Interface.Curses;
with Terminal_Interface.Curses.Panels;
use Terminal_Interface.Curses.Panels;
with Terminal_Interface.Curses.Menus;
use Terminal_Interface.Curses.Menus;
generic
with function My_Driver (Men : Menu;
K : Key_Code;
Pan : Panel) return Boolean;
package Sample.Menu_Demo.Handler is
procedure Drive_Me (M : Menu;
Lin : Line_Position;
Col : Column_Position;
Title : String := "");
-- Position the menu at the given point and drive it.
procedure Drive_Me (M : Menu;
Title : String := "");
-- Center menu and drive it.
end Sample.Menu_Demo.Handler;
|
zhmu/ananas | Ada | 2,374 | ads | pragma Spark_Mode (On);
generic
type Element_Type is private;
package Predicate8_Pkg is
pragma Annotate (GNATprove, Terminating, Predicate8_Pkg);
subtype Small_Natural is Natural range 0 .. Natural'Last / 2;
subtype Small_Positive is Natural range 1 .. Natural'Last / 2;
type Element_Array_Type is array (Small_Positive range <>) of Element_Type;
type Ring_Buffer_Type (Max_Size : Small_Positive) is private
with Default_Initial_Condition => Empty (Ring_Buffer_Type);
function Empty
(Buffer : in Ring_Buffer_Type) return Boolean;
function Full
(Buffer : in Ring_Buffer_Type) return Boolean;
function Size
(Buffer : in Ring_Buffer_Type) return Natural;
function Free
(Buffer : in Ring_Buffer_Type) return Natural;
function First
(Buffer : in Ring_Buffer_Type) return Element_Type
with
Pre => not Empty (Buffer);
function Last
(Buffer : in Ring_Buffer_Type) return Element_Type
with
Pre => not Empty (Buffer);
procedure Get
(Buffer : in out Ring_Buffer_Type;
Element : out Element_Type)
with
Pre => not Empty (Buffer) and
Size (Buffer) >= 1,
Post => not Full (Buffer) and then
Element = First (Buffer'Old) and then
Size (Buffer) = Size (Buffer'Old) - 1;
procedure Put
(Buffer : in out Ring_Buffer_Type;
Element : in Element_Type)
with
Pre => not Full (Buffer),
Post => not Empty (Buffer) and then
Last (Buffer) = Element and then
Size (Buffer) = Size (Buffer'Old) + 1;
procedure Clear
(Buffer : in out Ring_Buffer_Type)
with
Post => Empty (Buffer) and then
not Full (Buffer) and then
Size (Buffer) = 0;
private
type Ring_Buffer_Type (Max_Size : Small_Positive) is record
Count : Small_Natural := 0;
Head : Small_Positive := 1;
Tail : Small_Positive := Max_Size;
Items : Element_Array_Type (1 .. Max_Size);
end record
with Dynamic_Predicate =>
(Max_Size <= Small_Positive'Last and
Count <= Max_Size and
Head <= Max_Size and
Tail <= Max_Size and
((Count = 0 and Tail = Max_Size and Head = 1) or
(Count = Max_Size + Tail - Head + 1) or
(Count = Tail - Head + 1)));
end Predicate8_Pkg;
|
pdaxrom/Kino2 | Ada | 3,951 | adb | ------------------------------------------------------------------------------
-- --
-- GNAT ncurses Binding --
-- --
-- Terminal_Interface.Curses.Text_IO.Decimal_IO --
-- --
-- B O D Y --
-- --
------------------------------------------------------------------------------
-- Copyright (c) 1998 Free Software Foundation, Inc. --
-- --
-- Permission is hereby granted, free of charge, to any person obtaining a --
-- copy of this software and associated documentation files (the --
-- "Software"), to deal in the Software without restriction, including --
-- without limitation the rights to use, copy, modify, merge, publish, --
-- distribute, distribute with modifications, sublicense, and/or sell --
-- copies of the Software, and to permit persons to whom the Software is --
-- furnished to do so, subject to the following conditions: --
-- --
-- The above copyright notice and this permission notice shall be included --
-- in all copies or substantial portions of the Software. --
-- --
-- THE SOFTWARE IS PROVIDED "AS IS", WITHOUT WARRANTY OF ANY KIND, EXPRESS --
-- OR IMPLIED, INCLUDING BUT NOT LIMITED TO THE WARRANTIES OF --
-- MERCHANTABILITY, FITNESS FOR A PARTICULAR PURPOSE AND NONINFRINGEMENT. --
-- IN NO EVENT SHALL THE ABOVE COPYRIGHT HOLDERS BE LIABLE FOR ANY CLAIM, --
-- DAMAGES OR OTHER LIABILITY, WHETHER IN AN ACTION OF CONTRACT, TORT OR --
-- OTHERWISE, ARISING FROM, OUT OF OR IN CONNECTION WITH THE SOFTWARE OR --
-- THE USE OR OTHER DEALINGS IN THE SOFTWARE. --
-- --
-- Except as contained in this notice, the name(s) of the above copyright --
-- holders shall not be used in advertising or otherwise to promote the --
-- sale, use or other dealings in this Software without prior written --
-- authorization. --
------------------------------------------------------------------------------
-- Author: Juergen Pfeifer, 1996
-- Contact: http://www.familiepfeifer.de/Contact.aspx?Lang=en
-- Version Control:
-- $Revision: 1.9 $
-- Binding Version 01.00
------------------------------------------------------------------------------
with Ada.Text_IO;
with Terminal_Interface.Curses.Text_IO.Aux;
package body Terminal_Interface.Curses.Text_IO.Decimal_IO is
package Aux renames Terminal_Interface.Curses.Text_IO.Aux;
package DIO is new Ada.Text_IO.Decimal_IO (Num);
procedure Put
(Win : in Window;
Item : in Num;
Fore : in Field := Default_Fore;
Aft : in Field := Default_Aft;
Exp : in Field := Default_Exp)
is
Buf : String (1 .. Field'Last);
Len : Field := Fore + 1 + Aft;
begin
if Exp > 0 then
Len := Len + 1 + Exp;
end if;
DIO.Put (Buf, Item, Aft, Exp);
Aux.Put_Buf (Win, Buf, Len, False);
end Put;
procedure Put
(Item : in Num;
Fore : in Field := Default_Fore;
Aft : in Field := Default_Aft;
Exp : in Field := Default_Exp) is
begin
Put (Get_Window, Item, Fore, Aft, Exp);
end Put;
end Terminal_Interface.Curses.Text_IO.Decimal_IO;
|
AdaCore/gpr | Ada | 34,668 | adb | ------------------------------------------------------------------------------
-- --
-- GPR2 PROJECT MANAGER --
-- --
-- Copyright (C) 2021-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/>. --
-- --
------------------------------------------------------------------------------
with Ada.Command_Line;
with Ada.Containers.Indefinite_Ordered_Maps;
with Ada.Characters.Handling;
with Ada.Directories;
with Ada.Integer_Text_IO;
with Ada.IO_Exceptions;
with Ada.Exceptions;
with Ada.Text_IO;
with Ada.Strings.Fixed;
with Ada.Strings.Unbounded;
with GNAT.Command_Line;
with GNAT.Directory_Operations;
with GNAT.OS_Lib;
with GNAT.String_Split;
with GNATCOLL.Traces;
with GPR2.Containers;
with GPR2.KB;
with GPR2.Log;
with GPR2.Message;
with GPR2.Path_Name.Set;
with GPR2.Project.Configuration;
with GPR2.Version;
with GPRtools.Util;
procedure GPRconfig is
use Ada;
use Ada.Containers;
use Ada.Strings.Unbounded;
use GNAT.Command_Line;
use GPR2;
use GPR2.KB;
use GPR2.Project.Configuration;
Knowledge_Base : KB.Object;
type Verbosity_Kind is (Quiet, Default, Verbose);
Opt_Verbosity : Verbosity_Kind := Default;
Opt_Version : aliased Boolean;
Opt_Target : aliased GNAT.OS_Lib.String_Access;
Opt_Show_Targets : aliased Boolean;
Opt_Show_MI : aliased Boolean;
Opt_Show_Known : aliased Boolean;
Opt_Batch : aliased Boolean;
Opt_O : aliased GNAT.OS_Lib.String_Access;
Opt_DB : Boolean := False;
Opt_Validate : aliased Boolean;
Opt_Fallback : aliased Boolean;
KB_Flags : Parsing_Flags := Default_Flags;
Cmd_Config : Command_Line_Configuration;
KB_Locations : GPR2.Path_Name.Set.Object;
function "=" (L, R : Description) return Boolean is
(Language (L) = Language (R));
-- Compares descriptions. Only one description per language is expected
package Description_Maps is new Ada.Containers.Indefinite_Ordered_Maps
(Language_Id, Description);
Description_Map : Description_Maps.Map;
procedure Register_Cmd_Options;
-- Registers accepted gprconfig switches
procedure Value_Callback (Switch, Value : String);
-- Parses command line switches
procedure Report_Error_And_Exit (Msg : String);
-- Outputs error message and raises Exit_From_Command_Line
function Parse_Config_Parameter (Config : String) return Description;
-- Parses the value of --config switch into Decription
function Get_Settings (Map : Description_Maps.Map) return Description_Set;
-- Turns the map of processed config parameters into Description_Set
procedure Display_Compilers_For_Parser
(Base : KB.Object;
Compilers : in out Compiler_Array;
For_Target : Name_Type);
-- Display the list of found compilers for use by an external parser
procedure Select_Compilers_Interactively
(Base : in out KB.Object;
Compilers : in out Compiler_Array;
For_Target : Name_Type);
-- Asks the user for compilers to be selected
procedure Show_Command_Line_Config
(Compilers : Compiler_Array; Target : String);
-- Displays the batch command line that would have the same effect as the
-- current selection of compilers.
----------------------------------
-- Display_Compilers_For_Parser --
----------------------------------
procedure Display_Compilers_For_Parser
(Base : KB.Object;
Compilers : in out Compiler_Array;
For_Target : Name_Type)
is
Comp : Compiler;
function "&" (L : String; R : Optional_Name_Type) return String is
(L & String (R));
procedure Put_Rank (Comp : Compiler; Idx : Positive);
-- Outputs prefix with rank and selection
--------------
-- Put_Rank --
--------------
procedure Put_Rank (Comp : Compiler; Idx : Positive) is
begin
if Is_Selected (Comp) then
Text_IO.Put ("*");
Integer_Text_IO.Put (Idx, Width => 3);
else
Integer_Text_IO.Put (Idx, Width => 4);
end if;
end Put_Rank;
begin
Base.Filter_Compilers_List (Compilers, For_Target);
for Idx in Compilers'Range loop
Comp := Compilers (Idx);
if Is_Selectable (Comp) and then Requires_Compiler (Comp) then
Put_Rank (Comp, Idx);
Text_IO.Put_Line (" target:" & Target (Comp));
Put_Rank (Comp, Idx);
Text_IO.Put_Line
(" normalized_target:" & Base.Normalized_Target (Target (Comp)));
Put_Rank (Comp, Idx);
Text_IO.Put_Line (" executable:" & Executable (Comp));
Put_Rank (Comp, Idx);
Text_IO.Put_Line (" path:" & Path (Comp));
Put_Rank (Comp, Idx);
Text_IO.Put_Line (" lang:" & Image (Language (Comp)));
Put_Rank (Comp, Idx);
Text_IO.Put_Line (" name:" & Name (Comp));
Put_Rank (Comp, Idx);
Text_IO.Put_Line (" version:" & KB.Version (Comp));
Put_Rank (Comp, Idx);
Text_IO.Put_Line (" runtime:" & Runtime (Comp));
Put_Rank (Comp, Idx);
Text_IO.Put_Line
(" native:"
& Boolean'Image
(Base.Normalized_Target (Default_Target) =
Base.Normalized_Target (Target (Comp))));
elsif Is_Selectable (Comp) then
Put_Rank (Comp, Idx);
Text_IO.Put_Line (" target:");
Put_Rank (Comp, Idx);
Text_IO.Put_Line
(" normalized_target:unknown");
Put_Rank (Comp, Idx);
Text_IO.Put_Line (" executable:");
Put_Rank (Comp, Idx);
Text_IO.Put_Line (" path:");
Put_Rank (Comp, Idx);
Text_IO.Put_Line (" lang:" & String (Name (Language (Comp))));
Put_Rank (Comp, Idx);
Text_IO.Put_Line (" name:");
Put_Rank (Comp, Idx);
Text_IO.Put_Line (" version:");
Put_Rank (Comp, Idx);
Text_IO.Put_Line (" runtime:");
Put_Rank (Comp, Idx);
Text_IO.Put_Line (" native:FALSE");
end if;
end loop;
end Display_Compilers_For_Parser;
------------------
-- Get_Settings --
------------------
function Get_Settings (Map : Description_Maps.Map) return Description_Set is
Result : Description_Set (1 .. Integer (Map.Length));
Idx : Positive := 1;
begin
for Descr of Map loop
Result (Idx) := Descr;
Idx := Idx + 1;
end loop;
return Result;
end Get_Settings;
----------------------------
-- Parse_Config_Parameter --
----------------------------
function Parse_Config_Parameter (Config : String) return Description is
use Ada.Characters.Handling;
use GNAT.String_Split;
function Positional_Parameters return Boolean;
-- Returns True if configuration parameters are given in a positional
-- form, i.e. --config=language:ada,runtime:sjlj.
-- Also checks that the two modes are not mixed up,
-- reports error otherwise.
procedure Check_Positional;
-- Checks that positional prefixes are not duplicated
function Get_Description_Param
(Slices : Slice_Set; Pos : Slice_Number) return Optional_Name_Type
is
(if not Has_Element (Slices, Pos) or else Slice (Slices, Pos) = ""
then No_Name else Optional_Name_Type (Slice (Slices, Pos)));
-- Returns parameter of configuration for given position or No_Name
-- if corresponding position is empty/absent. Reports error ans fails
-- if prefix is not followed by a value.
function Get_Description_Param
(Slices : Slice_Set; Prefix : String) return Optional_Name_Type;
-- Returns parameter of configuration for given Prefix or No_Name
-- if corresponding position is empty/absent.
Slices : constant Slice_Set := Create (Config, ",");
----------------------
-- Check_Positional --
----------------------
procedure Check_Positional is
use Ada.Strings.Fixed;
Language_Set : Boolean := False;
Version_Set : Boolean := False;
Runtime_Set : Boolean := False;
Path_Set : Boolean := False;
Name_Set : Boolean := False;
begin
for Slice of Slices loop
if To_Lower (Head (Slice, 9)) = "language:" then
if Language_Set then
Report_Error_And_Exit
("Configuration parameter language specified twice in "
& Config
& ASCII.LF
& "Invalid configuration specified with --config");
else
Language_Set := True;
end if;
elsif To_Lower (Head (Slice, 8)) = "version:" then
if Version_Set then
Report_Error_And_Exit
("Configuration parameter version specified twice in "
& Config
& ASCII.LF
& "Invalid configuration specified with --config");
else
Version_Set := True;
end if;
elsif To_Lower (Head (Slice, 8)) = "runtime:" then
if Runtime_Set then
Report_Error_And_Exit
("Configuration parameter runtime specified twice in "
& Config
& ASCII.LF
& "Invalid configuration specified with --config");
else
Runtime_Set := True;
end if;
elsif To_Lower (Head (Slice, 5)) = "path:" then
if Path_Set then
Report_Error_And_Exit
("Configuration parameter path specified twice in "
& Config
& ASCII.LF
& "Invalid configuration specified with --config");
else
Path_Set := True;
end if;
elsif To_Lower (Head (Slice, 5)) = "name:" then
if Name_Set then
Report_Error_And_Exit
("Configuration parameter name specified twice in "
& Config
& ASCII.LF
& "Invalid configuration specified with --config");
else
Name_Set := True;
end if;
end if;
end loop;
end Check_Positional;
---------------------------
-- Get_Description_Param --
---------------------------
function Get_Description_Param
(Slices : Slice_Set; Prefix : String) return Optional_Name_Type
is
use Ada.Strings.Fixed;
Pref : constant String := Prefix & ":";
Pref_Len : constant Positive := Pref'Length;
begin
for Slice of Slices loop
if To_Lower (Head (Slice, Pref_Len)) = Pref then
if Slice = Pref then
Report_Error_And_Exit
("Parameter value for " & Prefix & " not specified in """
& Config & """" & ASCII.LF
& "Invalid configuration specified with --config");
end if;
return
Optional_Name_Type
(Slice (Slice'First + Pref_Len .. Slice'Last));
end if;
end loop;
return No_Name;
end Get_Description_Param;
---------------------------
-- Positional_Parameters --
---------------------------
function Positional_Parameters return Boolean is
use Ada.Strings.Fixed;
Positional_Present : Boolean := False;
Not_Positional_Present : Boolean := False;
begin
for Slice of Slices loop
if Slice = ""
or else (To_Lower (Head (Slice, 9)) /= "language:"
and then To_Lower (Head (Slice, 8)) /= "version:"
and then To_Lower (Head (Slice, 8)) /= "runtime:"
and then To_Lower (Head (Slice, 5)) /= "path:"
and then To_Lower (Head (Slice, 5)) /= "name:")
then
Not_Positional_Present := True;
else
Positional_Present := True;
end if;
if Not_Positional_Present and then Positional_Present then
Report_Error_And_Exit
("Mixing positional and not positional parameters in """
& Config & """"
& ASCII.LF
& "Invalid configuration specified with --config");
end if;
end loop;
return Positional_Present;
end Positional_Parameters;
Result : Description;
begin
if Slice_Count (Slices) > 5 then
Report_Error_And_Exit
("Too many arguments in configuration """ & Config & """"
& ASCII.LF
& "Invalid configuration specified with --config");
end if;
if Positional_Parameters then
Check_Positional;
if Get_Description_Param (Slices, "language") = No_Name then
Report_Error_And_Exit
("Language not specified if " & Config
& ASCII.LF
& "Invalid configuration specified with --config");
end if;
Result := Project.Configuration.Create
(Language => +Get_Description_Param (Slices, "language"),
Version => Get_Description_Param (Slices, "version"),
Runtime => Get_Description_Param (Slices, "runtime"),
Path => Filename_Optional
(Get_Description_Param (Slices, "path")),
Name => Get_Description_Param (Slices, "name"));
else
if Get_Description_Param (Slices, 1) = No_Name then
Report_Error_And_Exit
("Language not specified if " & Config
& ASCII.LF
& "Invalid configuration specified with --config");
end if;
Result := Project.Configuration.Create
(Language => +Get_Description_Param (Slices, 1),
Version => Get_Description_Param (Slices, 2),
Runtime => Get_Description_Param (Slices, 3),
Path => Filename_Optional (Get_Description_Param (Slices, 4)),
Name => Get_Description_Param (Slices, 5));
end if;
return Result;
end Parse_Config_Parameter;
--------------------------
-- Register_Cmd_Options --
--------------------------
procedure Register_Cmd_Options is
begin
Define_Switch
(Cmd_Config, Opt_Version'Access,
Long_Switch => "--version",
Help => "Display version and exit");
Define_Switch
(Cmd_Config,
Switch => "-h",
Long_Switch => "--help",
Help => "Display usage and exit");
Define_Switch
(Cmd_Config, Opt_Target'Access,
Long_Switch => "--target=",
Help =>
"Select specified target or ""all"" for any target" & ASCII.LF
& " ("
& String (Default_Target)
& " by default)",
Argument => "target");
Define_Switch
(Cmd_Config, Opt_Show_Targets'Access,
Long_Switch => "--show-targets",
Help => "List all compiler targets available");
Define_Switch
(Cmd_Config, Opt_Show_MI'Access,
Long_Switch => "--mi-show-compilers",
Help =>
"List all compilers available in a parser-friendly way");
Define_Switch
(Cmd_Config, Opt_Show_Known'Access,
Long_Switch => "--show-known-compilers",
Help =>
"List names of all known compilers");
Define_Switch
(Cmd_Config, Opt_Batch'Access,
Long_Switch => "--batch",
Help => "Batch mode, no interactive compiler selection");
Define_Switch
(Cmd_Config, Value_Callback'Unrestricted_Access,
Switch => "-v",
Help => "Verbose mode");
Define_Switch
(Cmd_Config, Value_Callback'Unrestricted_Access,
Switch => "-q",
Help => "Quiet mode");
Define_Switch
(Cmd_Config, Opt_O'Access,
Switch => "-o:",
Help =>
"Name and directory of the output file" & ASCII.LF
& " (default is default.cgpr)",
Argument => "file");
Define_Switch
(Cmd_Config, Value_Callback'Unrestricted_Access,
Long_Switch => "--db:",
Help =>
"Parse DIR as an additional knowledge base" & ASCII.LF
& " --db- Do not load the standard knowledge base",
Argument => "dir");
-- ??? Do we still want to point to the KB in file format
-- if it can be found?
Define_Switch
(Cmd_Config, Opt_Validate'Access,
Long_Switch => "--validate",
Help =>
"Validate contents of the knowledge base before loading");
Define_Switch
(Cmd_Config, Opt_Fallback'Access,
Long_Switch => "--fallback-targets",
Help =>
"Look for native toolchains of different architecture");
Define_Switch
(Cmd_Config, Value_Callback'Unrestricted_Access,
Long_Switch => "--config=",
Help =>
"Preselect a compiler."
& ASCII.LF
& " CONFIG=language[,version[,runtime[,path[,name]]]]"
& ASCII.LF
& " Name is either one of the names of the blocks"
& " in the knowledge base"
& ASCII.LF
& " ('GCC', 'GCC-28',...) or the base name of an executable"
& " ('gcc', 'gnatmake')."
& ASCII.LF
& " An empty string can be specified for any of the"
& " optional parameters,"
& ASCII.LF
& " otherwise positional prefixes can be used:"
& ASCII.LF
& " --config=language:ada,runtime:zfp equals to "
& "--config=ada,,zfp.",
Argument => "config");
Set_Usage (Cmd_Config, Usage => "[switches]");
end Register_Cmd_Options;
---------------------------
-- Report_Error_And_Exit --
---------------------------
procedure Report_Error_And_Exit (Msg : String) is
begin
Text_IO.Put_Line (Text_IO.Standard_Error, Msg);
raise Exit_From_Command_Line;
end Report_Error_And_Exit;
------------------------------------
-- Select_Compilers_Interactively --
------------------------------------
procedure Select_Compilers_Interactively
(Base : in out KB.Object;
Compilers : in out Compiler_Array;
For_Target : Name_Type)
is
Input : Unbounded_String;
Comp : Compiler;
begin
loop
Base.Filter_Compilers_List (Compilers, For_Target);
Text_IO.Put_Line
("--------------------------------------------------");
Text_IO.Put_Line
("gprconfig has found the following compilers on your PATH.");
Text_IO.Put_Line
("Only those matching the target and the selected compilers"
& " are displayed.");
for Idx in Compilers'Range loop
Comp := Compilers (Idx);
if Is_Selectable (Comp) then
if Is_Selected (Comp) then
Text_IO.Put ("*");
Integer_Text_IO.Put (Idx, Width => 3);
else
Integer_Text_IO. Put (Idx, Width => 4);
end if;
Text_IO.Put (". ");
if Requires_Compiler (Comp) then
Text_IO.Put
(String (Name (Comp))
& " for "
& Image (Language (Comp))
& " in "
& String (Path (Comp)));
if For_Target = "all" then
Text_IO.Put (" on " & String (Target (Comp)));
end if;
Text_IO.Put
(" version " & String (KB.Version (Comp)));
if Runtime (Comp, True) = No_Name then
Text_IO.New_Line;
else
Text_IO.Put_Line
(" ("
& String (Runtime (Comp, True))
& " runtime)");
end if;
else
Text_IO.Put_Line
(Image (Language (Comp)) &
" (no compiler required)");
end if;
end if;
end loop;
Text_IO.Put
("Select or unselect the following compiler (or ""s"" to save): ");
Input := To_Unbounded_String (Text_IO.Get_Line);
exit when To_String (Input) = "s";
declare
Choice : Positive;
begin
Choice := Positive'Value (To_String (Input));
if Choice > Compilers'Last then
Text_IO.Put_Line ("Unrecognized choice");
else
if Is_Selected (Compilers (Choice)) then
Set_Selection (Compilers (Choice), False);
else
Set_Selection (Compilers (Choice), True);
end if;
end if;
exception
when Constraint_Error =>
Text_IO.Put_Line ("Unrecognized choice");
end;
end loop;
end Select_Compilers_Interactively;
------------------------------
-- Show_Command_Line_Config --
------------------------------
procedure Show_Command_Line_Config
(Compilers : Compiler_Array; Target : String) is
begin
if Compilers = No_Compilers then
return;
end if;
Text_IO.New_Line;
Text_IO.Put_Line
("You can regenerate the same config file in batch mode");
Text_IO.Put_Line (" with the following command line:");
Text_IO.Put ("gprconfig --batch");
Text_IO.Put (" --target=");
Text_IO.Put (Target);
for Comp of Compilers loop
if Is_Selected (Comp) then
Text_IO.Put (" --config=");
if Requires_Compiler (Comp) then
Text_IO.Put
(Image (Language (Comp)) & ","
& String (KB.Version (Comp)) & ","
& String (Runtime (Comp)) & ","
& String (Path (Comp)) & ","
& String (Name (Comp)));
else
Text_IO.Put (Image (Language (Comp)) & ",,,,");
end if;
end if;
end loop;
Text_IO.New_Line;
Text_IO.New_Line;
end Show_Command_Line_Config;
--------------------
-- Value_Callback --
--------------------
procedure Value_Callback (Switch, Value : String) is
Descr : Project.Configuration.Description;
begin
if Switch = "--db" then
if Value = "-" then
Opt_DB := True;
else
declare
KB_Norm : constant String :=
GNAT.OS_Lib.Normalize_Pathname (Value);
KB_Path : GPR2.Path_Name.Object;
begin
if GNAT.OS_Lib.Is_Directory (KB_Norm) then
KB_Path :=
GPR2.Path_Name.Create_Directory
(GPR2.Filename_Type (KB_Norm));
elsif GNAT.OS_Lib.Is_Regular_File (KB_Norm) then
KB_Path :=
GPR2.Path_Name.Create_File (GPR2.Filename_Type (KB_Norm));
else
Report_Error_And_Exit
(KB_Norm & " is not a file or directory");
end if;
KB_Locations.Append (KB_Path);
end;
end if;
elsif Switch = "--config" then
Descr := Parse_Config_Parameter (Value);
if Description_Map.Contains (Language (Descr)) then
Report_Error_And_Exit
("Multiple --config specified for " & Image (Language (Descr)));
end if;
Description_Map.Include (Language (Descr), Descr);
elsif Switch = "-q" then
Opt_Verbosity := Quiet;
elsif Switch = "-v" then
Opt_Verbosity := Verbose;
end if;
end Value_Callback;
Config_Contents : Unbounded_String;
Selected_Target : Unbounded_String;
Output_File : Unbounded_String;
Config_Log : Log.Object;
Output : Text_IO.File_Type;
Default_Config_File_Name : constant String := "default.cgpr";
begin
begin
GNATCOLL.Traces.Parse_Config_File;
exception
when E : others =>
Text_IO.Put_Line
(Text_IO.Standard_Error,
"Cannot parse trace configuration file "
& "(traces may work incorrectly):");
Text_IO.Put_Line
(Text_IO.Standard_Error,
Ada.Exceptions.Exception_Message (E));
end;
GPRtools.Util.Set_Program_Name ("gprconfig");
Register_Cmd_Options;
Getopt (Cmd_Config);
if Opt_Version then
GPR2.Version.Display
("GPRCONFIG", "2006", Version_String => GPR2.Version.Long_Value);
GPR2.Version.Display_Free_Software;
return;
end if;
if Opt_Batch and then Opt_Target.all = "all" then
if Opt_Verbosity > Quiet then
Text_IO.Put_Line
(Text_IO.Standard_Error,
"--target=all ignored in --batch mode");
end if;
GNAT.OS_Lib.Free (Opt_Target);
Opt_Target := new String'("");
end if;
KB_Flags (Validation) := Opt_Validate;
if Opt_Verbosity = Verbose then
GNATCOLL.Traces.Set_Active
(GNATCOLL.Traces.Create
("KNOWLEDGE_BASE"), True);
GNATCOLL.Traces.Set_Active
(GNATCOLL.Traces.Create
("KNOWLEDGE_BASE.PARSING_TRACE"), True);
GNATCOLL.Traces.Set_Active
(GNATCOLL.Traces.Create
("KNOWLEDGE_BASE.MATHCING"), True);
GNATCOLL.Traces.Set_Active
(GNATCOLL.Traces.Create
("KNOWLEDGE_BASE.COMPILER_ITERATOR"), True);
end if;
if Opt_DB then
Knowledge_Base := Create_Empty;
else
Knowledge_Base := Create_Default (KB_Flags);
end if;
for KB_Location of KB_Locations loop
Knowledge_Base.Add (KB_Flags, KB_Location);
end loop;
for Msg_Cur in Knowledge_Base.Log_Messages.Iterate
(Information => Opt_Verbosity = Verbose,
Warning => Opt_Verbosity = Verbose)
loop
Log.Element (Msg_Cur).Output;
end loop;
if Knowledge_Base.Has_Error then
Text_IO.Put_Line
(Text_IO.Standard_Error,
"Invalid setup of the gprconfig knowledge base");
GNAT.OS_Lib.OS_Exit (1);
end if;
if Opt_Show_Known then
Text_IO.Put_Line
("The known compilers are: "
& To_String (Knowledge_Base.Known_Compiler_Names));
return;
end if;
if Opt_Target.all = "" then
Selected_Target :=
To_Unbounded_String
(String
(Knowledge_Base.Normalized_Target
(Default_Target)));
else
Selected_Target := To_Unbounded_String (Opt_Target.all);
end if;
if Opt_O.all = "" then
if Opt_Target.all = "" then
Output_File := To_Unbounded_String (Default_Config_File_Name);
else
Output_File := To_Unbounded_String (Opt_Target.all & ".cgpr");
end if;
else
Output_File := To_Unbounded_String (Opt_O.all);
end if;
if Opt_Batch then
Config_Contents := Configuration
(Self => Knowledge_Base,
Settings => Get_Settings (Description_Map),
Target => Name_Type (To_String (Selected_Target)),
Messages => Config_Log,
Fallback => Opt_Fallback);
else
if Opt_Show_Targets then
Selected_Target := To_Unbounded_String ("all");
end if;
declare
Compilers : Compiler_Array := Knowledge_Base.All_Compilers
(Settings => Get_Settings (Description_Map),
Target => Name_Type (To_String (Selected_Target)),
Messages => Config_Log);
Set_Of_Targets : GPR2.Containers.Name_Set;
begin
if Knowledge_Base.Has_Error then
for Msg_Cur in Knowledge_Base.Log_Messages.Iterate
(Information => Opt_Verbosity > Quiet,
Warning => Opt_Verbosity > Quiet)
loop
Log.Element (Msg_Cur).Output;
end loop;
Text_IO.Put_Line
(Text_IO.Standard_Error,
"Invalid setup of the gprconfig knowledge base");
GNAT.OS_Lib.OS_Exit (1);
end if;
if Opt_Show_Targets or else Opt_Verbosity = Verbose then
Text_IO.Put_Line ("List of targets supported by a compiler:");
for Comp of Compilers loop
Set_Of_Targets.Include
(Knowledge_Base.Normalized_Target (Target (Comp)));
end loop;
for Tgt of Set_Of_Targets loop
Text_IO.Put (String (Tgt));
if Tgt = Default_Target then
Text_IO.Put_Line (" (native target)");
else
Text_IO.New_Line;
end if;
end loop;
end if;
if Opt_Show_Targets then
return;
end if;
if Compilers'Length = 0 then
if Selected_Target = Null_Unbounded_String then
Text_IO.Put_Line
(Text_IO.Standard_Error,
"No compilers found for target "
& To_String (Selected_Target));
else
Text_IO.Put_Line
(Text_IO.Standard_Error, "No compilers found");
end if;
GNAT.OS_Lib.OS_Exit (1);
end if;
if Opt_Show_MI then
Display_Compilers_For_Parser
(Knowledge_Base, Compilers,
Name_Type (To_String (Selected_Target)));
return;
else
Select_Compilers_Interactively
(Knowledge_Base, Compilers,
Name_Type (To_String (Selected_Target)));
Show_Command_Line_Config (Compilers, To_String (Selected_Target));
end if;
Config_Contents := Configuration
(Self => Knowledge_Base,
Selection => Compilers,
Target => Name_Type (To_String (Selected_Target)),
Messages => Config_Log);
end;
end if;
if Config_Log.Has_Error then
for Msg_Cur in Config_Log.Iterate
(Information => Opt_Verbosity > Quiet,
Warning => Opt_Verbosity > Quiet,
Read => False)
loop
Log.Element (Msg_Cur).Output;
end loop;
Text_IO.Put_Line
(Text_IO.Standard_Error,
"Generation of configuration files failed");
GNAT.OS_Lib.OS_Exit (1);
elsif Knowledge_Base.Has_Error then
for Msg_Cur in Knowledge_Base.Log_Messages.Iterate
(Information => Opt_Verbosity > Quiet,
Warning => Opt_Verbosity > Quiet)
loop
Log.Element (Msg_Cur).Output;
end loop;
Text_IO.Put_Line
(Text_IO.Standard_Error,
"Invalid setup of the gprconfig knowledge base");
GNAT.OS_Lib.OS_Exit (1);
else
for Msg_Cur in Config_Log.Iterate
(Information => Opt_Verbosity > Quiet)
loop
Log.Element (Msg_Cur).Output;
end loop;
end if;
if Config_Contents /= Null_Unbounded_String then
Text_IO.Create
(Output, Text_IO.Out_File, To_String (Output_File));
Text_IO.Put_Line
(Output, "-- This gpr configuration file was generated by gprconfig");
Text_IO.Put_Line (Output, "-- using this command line:");
Text_IO.Put (Output, "-- " & Ada.Command_Line.Command_Name);
for I in 1 .. Ada.Command_Line.Argument_Count loop
Text_IO.Put (Output, ' ');
Text_IO.Put (Output, Ada.Command_Line.Argument (I));
end loop;
Text_IO.New_Line (Output);
Text_IO.Put (Output, "-- from ");
Text_IO.Put (Output, GNAT.Directory_Operations.Get_Current_Dir);
Text_IO.New_Line (Output);
Text_IO.Put_Line (Output, To_String (Config_Contents));
Text_IO.Close (Output);
end if;
GNAT.Command_Line.Free (Config => Cmd_Config);
exception
when Ada.Directories.Name_Error | Ada.IO_Exceptions.Use_Error =>
GNAT.Command_Line.Free (Config => Cmd_Config);
Text_IO.Put_Line
(Text_IO.Standard_Error,
"Could not create the file " & To_String (Output_File));
when Invalid_Switch | Exit_From_Command_Line =>
GNAT.Command_Line.Free (Config => Cmd_Config);
GNAT.OS_Lib.OS_Exit (1);
when Invalid_Parameter =>
GNAT.Command_Line.Free (Config => Cmd_Config);
Text_IO.Put_Line
(Text_IO.Standard_Error,
"Missing parameter for switch: -" & Full_Switch);
Text_IO.Put_Line
(Text_IO.Standard_Error,
"try ""gprconfig --help"" for more information.");
when E : others =>
Text_IO.Put_Line
(Text_IO.Standard_Error,
"Unrecoverable error in GPRconfig: "
& Ada.Exceptions.Exception_Information (E));
GNAT.Command_Line.Free (Config => Cmd_Config);
GNAT.OS_Lib.OS_Exit (1);
end GPRconfig;
|
reznikmm/matreshka | Ada | 4,229 | 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 Matreshka.DOM_Nodes;
with XML.DOM.Attributes.Internals;
package body ODF.DOM.Attributes.FO.Font_Style.Internals is
------------
-- Create --
------------
function Create
(Node : Matreshka.ODF_Attributes.FO.Font_Style.FO_Font_Style_Access)
return ODF.DOM.Attributes.FO.Font_Style.ODF_FO_Font_Style is
begin
return
(XML.DOM.Attributes.Internals.Create
(Matreshka.DOM_Nodes.Attribute_Access (Node)) with null record);
end Create;
----------
-- Wrap --
----------
function Wrap
(Node : Matreshka.ODF_Attributes.FO.Font_Style.FO_Font_Style_Access)
return ODF.DOM.Attributes.FO.Font_Style.ODF_FO_Font_Style is
begin
return
(XML.DOM.Attributes.Internals.Wrap
(Matreshka.DOM_Nodes.Attribute_Access (Node)) with null record);
end Wrap;
end ODF.DOM.Attributes.FO.Font_Style.Internals;
|
Fabien-Chouteau/samd51-hal | Ada | 34,619 | ads | -- ============================================================================
-- Atmel Microcontroller Software Support
-- ============================================================================
-- Copyright (c) 2017 Atmel Corporation,
-- a wholly owned subsidiary of Microchip Technology Inc.
--
-- 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 Licence 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.
-- ============================================================================
-- This spec has been automatically generated from ATSAMD51J19A.svd
pragma Restrictions (No_Elaboration_Code);
pragma Ada_2012;
pragma Style_Checks (Off);
with HAL;
with System;
package SAM_SVD.OSCCTRL is
pragma Preelaborate;
---------------
-- Registers --
---------------
-- OSCCTRL_EVCTRL_CFDEO array
type OSCCTRL_EVCTRL_CFDEO_Field_Array is array (0 .. 1) of Boolean
with Component_Size => 1, Size => 2;
-- Type definition for OSCCTRL_EVCTRL_CFDEO
type OSCCTRL_EVCTRL_CFDEO_Field
(As_Array : Boolean := False)
is record
case As_Array is
when False =>
-- CFDEO as a value
Val : HAL.UInt2;
when True =>
-- CFDEO as an array
Arr : OSCCTRL_EVCTRL_CFDEO_Field_Array;
end case;
end record
with Unchecked_Union, Size => 2;
for OSCCTRL_EVCTRL_CFDEO_Field use record
Val at 0 range 0 .. 1;
Arr at 0 range 0 .. 1;
end record;
-- Event Control
type OSCCTRL_EVCTRL_Register is record
-- Clock 0 Failure Detector Event Output Enable
CFDEO : OSCCTRL_EVCTRL_CFDEO_Field :=
(As_Array => False, Val => 16#0#);
-- unspecified
Reserved_2_7 : HAL.UInt6 := 16#0#;
end record
with Volatile_Full_Access, Size => 8, Bit_Order => System.Low_Order_First;
for OSCCTRL_EVCTRL_Register use record
CFDEO at 0 range 0 .. 1;
Reserved_2_7 at 0 range 2 .. 7;
end record;
-- OSCCTRL_INTENCLR_XOSCRDY array
type OSCCTRL_INTENCLR_XOSCRDY_Field_Array is array (0 .. 1) of Boolean
with Component_Size => 1, Size => 2;
-- Type definition for OSCCTRL_INTENCLR_XOSCRDY
type OSCCTRL_INTENCLR_XOSCRDY_Field
(As_Array : Boolean := False)
is record
case As_Array is
when False =>
-- XOSCRDY as a value
Val : HAL.UInt2;
when True =>
-- XOSCRDY as an array
Arr : OSCCTRL_INTENCLR_XOSCRDY_Field_Array;
end case;
end record
with Unchecked_Union, Size => 2;
for OSCCTRL_INTENCLR_XOSCRDY_Field use record
Val at 0 range 0 .. 1;
Arr at 0 range 0 .. 1;
end record;
-- OSCCTRL_INTENCLR_XOSCFAIL array
type OSCCTRL_INTENCLR_XOSCFAIL_Field_Array is array (0 .. 1) of Boolean
with Component_Size => 1, Size => 2;
-- Type definition for OSCCTRL_INTENCLR_XOSCFAIL
type OSCCTRL_INTENCLR_XOSCFAIL_Field
(As_Array : Boolean := False)
is record
case As_Array is
when False =>
-- XOSCFAIL as a value
Val : HAL.UInt2;
when True =>
-- XOSCFAIL as an array
Arr : OSCCTRL_INTENCLR_XOSCFAIL_Field_Array;
end case;
end record
with Unchecked_Union, Size => 2;
for OSCCTRL_INTENCLR_XOSCFAIL_Field use record
Val at 0 range 0 .. 1;
Arr at 0 range 0 .. 1;
end record;
-- Interrupt Enable Clear
type OSCCTRL_INTENCLR_Register is record
-- XOSC 0 Ready Interrupt Enable
XOSCRDY : OSCCTRL_INTENCLR_XOSCRDY_Field :=
(As_Array => False, Val => 16#0#);
-- XOSC 0 Clock Failure Detector Interrupt Enable
XOSCFAIL : OSCCTRL_INTENCLR_XOSCFAIL_Field :=
(As_Array => False, Val => 16#0#);
-- unspecified
Reserved_4_7 : HAL.UInt4 := 16#0#;
-- DFLL Ready Interrupt Enable
DFLLRDY : Boolean := False;
-- DFLL Out Of Bounds Interrupt Enable
DFLLOOB : Boolean := False;
-- DFLL Lock Fine Interrupt Enable
DFLLLCKF : Boolean := False;
-- DFLL Lock Coarse Interrupt Enable
DFLLLCKC : Boolean := False;
-- DFLL Reference Clock Stopped Interrupt Enable
DFLLRCS : Boolean := False;
-- unspecified
Reserved_13_15 : HAL.UInt3 := 16#0#;
-- DPLL0 Lock Rise Interrupt Enable
DPLL0LCKR : Boolean := False;
-- DPLL0 Lock Fall Interrupt Enable
DPLL0LCKF : Boolean := False;
-- DPLL0 Lock Timeout Interrupt Enable
DPLL0LTO : Boolean := False;
-- DPLL0 Loop Divider Ratio Update Complete Interrupt Enable
DPLL0LDRTO : Boolean := False;
-- unspecified
Reserved_20_23 : HAL.UInt4 := 16#0#;
-- DPLL1 Lock Rise Interrupt Enable
DPLL1LCKR : Boolean := False;
-- DPLL1 Lock Fall Interrupt Enable
DPLL1LCKF : Boolean := False;
-- DPLL1 Lock Timeout Interrupt Enable
DPLL1LTO : Boolean := False;
-- DPLL1 Loop Divider Ratio Update Complete Interrupt Enable
DPLL1LDRTO : Boolean := False;
-- unspecified
Reserved_28_31 : HAL.UInt4 := 16#0#;
end record
with Volatile_Full_Access, Size => 32,
Bit_Order => System.Low_Order_First;
for OSCCTRL_INTENCLR_Register use record
XOSCRDY at 0 range 0 .. 1;
XOSCFAIL at 0 range 2 .. 3;
Reserved_4_7 at 0 range 4 .. 7;
DFLLRDY at 0 range 8 .. 8;
DFLLOOB at 0 range 9 .. 9;
DFLLLCKF at 0 range 10 .. 10;
DFLLLCKC at 0 range 11 .. 11;
DFLLRCS at 0 range 12 .. 12;
Reserved_13_15 at 0 range 13 .. 15;
DPLL0LCKR at 0 range 16 .. 16;
DPLL0LCKF at 0 range 17 .. 17;
DPLL0LTO at 0 range 18 .. 18;
DPLL0LDRTO at 0 range 19 .. 19;
Reserved_20_23 at 0 range 20 .. 23;
DPLL1LCKR at 0 range 24 .. 24;
DPLL1LCKF at 0 range 25 .. 25;
DPLL1LTO at 0 range 26 .. 26;
DPLL1LDRTO at 0 range 27 .. 27;
Reserved_28_31 at 0 range 28 .. 31;
end record;
-- OSCCTRL_INTENSET_XOSCRDY array
type OSCCTRL_INTENSET_XOSCRDY_Field_Array is array (0 .. 1) of Boolean
with Component_Size => 1, Size => 2;
-- Type definition for OSCCTRL_INTENSET_XOSCRDY
type OSCCTRL_INTENSET_XOSCRDY_Field
(As_Array : Boolean := False)
is record
case As_Array is
when False =>
-- XOSCRDY as a value
Val : HAL.UInt2;
when True =>
-- XOSCRDY as an array
Arr : OSCCTRL_INTENSET_XOSCRDY_Field_Array;
end case;
end record
with Unchecked_Union, Size => 2;
for OSCCTRL_INTENSET_XOSCRDY_Field use record
Val at 0 range 0 .. 1;
Arr at 0 range 0 .. 1;
end record;
-- OSCCTRL_INTENSET_XOSCFAIL array
type OSCCTRL_INTENSET_XOSCFAIL_Field_Array is array (0 .. 1) of Boolean
with Component_Size => 1, Size => 2;
-- Type definition for OSCCTRL_INTENSET_XOSCFAIL
type OSCCTRL_INTENSET_XOSCFAIL_Field
(As_Array : Boolean := False)
is record
case As_Array is
when False =>
-- XOSCFAIL as a value
Val : HAL.UInt2;
when True =>
-- XOSCFAIL as an array
Arr : OSCCTRL_INTENSET_XOSCFAIL_Field_Array;
end case;
end record
with Unchecked_Union, Size => 2;
for OSCCTRL_INTENSET_XOSCFAIL_Field use record
Val at 0 range 0 .. 1;
Arr at 0 range 0 .. 1;
end record;
-- Interrupt Enable Set
type OSCCTRL_INTENSET_Register is record
-- XOSC 0 Ready Interrupt Enable
XOSCRDY : OSCCTRL_INTENSET_XOSCRDY_Field :=
(As_Array => False, Val => 16#0#);
-- XOSC 0 Clock Failure Detector Interrupt Enable
XOSCFAIL : OSCCTRL_INTENSET_XOSCFAIL_Field :=
(As_Array => False, Val => 16#0#);
-- unspecified
Reserved_4_7 : HAL.UInt4 := 16#0#;
-- DFLL Ready Interrupt Enable
DFLLRDY : Boolean := False;
-- DFLL Out Of Bounds Interrupt Enable
DFLLOOB : Boolean := False;
-- DFLL Lock Fine Interrupt Enable
DFLLLCKF : Boolean := False;
-- DFLL Lock Coarse Interrupt Enable
DFLLLCKC : Boolean := False;
-- DFLL Reference Clock Stopped Interrupt Enable
DFLLRCS : Boolean := False;
-- unspecified
Reserved_13_15 : HAL.UInt3 := 16#0#;
-- DPLL0 Lock Rise Interrupt Enable
DPLL0LCKR : Boolean := False;
-- DPLL0 Lock Fall Interrupt Enable
DPLL0LCKF : Boolean := False;
-- DPLL0 Lock Timeout Interrupt Enable
DPLL0LTO : Boolean := False;
-- DPLL0 Loop Divider Ratio Update Complete Interrupt Enable
DPLL0LDRTO : Boolean := False;
-- unspecified
Reserved_20_23 : HAL.UInt4 := 16#0#;
-- DPLL1 Lock Rise Interrupt Enable
DPLL1LCKR : Boolean := False;
-- DPLL1 Lock Fall Interrupt Enable
DPLL1LCKF : Boolean := False;
-- DPLL1 Lock Timeout Interrupt Enable
DPLL1LTO : Boolean := False;
-- DPLL1 Loop Divider Ratio Update Complete Interrupt Enable
DPLL1LDRTO : Boolean := False;
-- unspecified
Reserved_28_31 : HAL.UInt4 := 16#0#;
end record
with Volatile_Full_Access, Size => 32,
Bit_Order => System.Low_Order_First;
for OSCCTRL_INTENSET_Register use record
XOSCRDY at 0 range 0 .. 1;
XOSCFAIL at 0 range 2 .. 3;
Reserved_4_7 at 0 range 4 .. 7;
DFLLRDY at 0 range 8 .. 8;
DFLLOOB at 0 range 9 .. 9;
DFLLLCKF at 0 range 10 .. 10;
DFLLLCKC at 0 range 11 .. 11;
DFLLRCS at 0 range 12 .. 12;
Reserved_13_15 at 0 range 13 .. 15;
DPLL0LCKR at 0 range 16 .. 16;
DPLL0LCKF at 0 range 17 .. 17;
DPLL0LTO at 0 range 18 .. 18;
DPLL0LDRTO at 0 range 19 .. 19;
Reserved_20_23 at 0 range 20 .. 23;
DPLL1LCKR at 0 range 24 .. 24;
DPLL1LCKF at 0 range 25 .. 25;
DPLL1LTO at 0 range 26 .. 26;
DPLL1LDRTO at 0 range 27 .. 27;
Reserved_28_31 at 0 range 28 .. 31;
end record;
-- OSCCTRL_INTFLAG_XOSCRDY array
type OSCCTRL_INTFLAG_XOSCRDY_Field_Array is array (0 .. 1) of Boolean
with Component_Size => 1, Size => 2;
-- Type definition for OSCCTRL_INTFLAG_XOSCRDY
type OSCCTRL_INTFLAG_XOSCRDY_Field
(As_Array : Boolean := False)
is record
case As_Array is
when False =>
-- XOSCRDY as a value
Val : HAL.UInt2;
when True =>
-- XOSCRDY as an array
Arr : OSCCTRL_INTFLAG_XOSCRDY_Field_Array;
end case;
end record
with Unchecked_Union, Size => 2;
for OSCCTRL_INTFLAG_XOSCRDY_Field use record
Val at 0 range 0 .. 1;
Arr at 0 range 0 .. 1;
end record;
-- OSCCTRL_INTFLAG_XOSCFAIL array
type OSCCTRL_INTFLAG_XOSCFAIL_Field_Array is array (0 .. 1) of Boolean
with Component_Size => 1, Size => 2;
-- Type definition for OSCCTRL_INTFLAG_XOSCFAIL
type OSCCTRL_INTFLAG_XOSCFAIL_Field
(As_Array : Boolean := False)
is record
case As_Array is
when False =>
-- XOSCFAIL as a value
Val : HAL.UInt2;
when True =>
-- XOSCFAIL as an array
Arr : OSCCTRL_INTFLAG_XOSCFAIL_Field_Array;
end case;
end record
with Unchecked_Union, Size => 2;
for OSCCTRL_INTFLAG_XOSCFAIL_Field use record
Val at 0 range 0 .. 1;
Arr at 0 range 0 .. 1;
end record;
-- Interrupt Flag Status and Clear
type OSCCTRL_INTFLAG_Register is record
-- XOSC 0 Ready
XOSCRDY : OSCCTRL_INTFLAG_XOSCRDY_Field :=
(As_Array => False, Val => 16#0#);
-- XOSC 0 Clock Failure Detector
XOSCFAIL : OSCCTRL_INTFLAG_XOSCFAIL_Field :=
(As_Array => False, Val => 16#0#);
-- unspecified
Reserved_4_7 : HAL.UInt4 := 16#0#;
-- DFLL Ready
DFLLRDY : Boolean := False;
-- DFLL Out Of Bounds
DFLLOOB : Boolean := False;
-- DFLL Lock Fine
DFLLLCKF : Boolean := False;
-- DFLL Lock Coarse
DFLLLCKC : Boolean := False;
-- DFLL Reference Clock Stopped
DFLLRCS : Boolean := False;
-- unspecified
Reserved_13_15 : HAL.UInt3 := 16#0#;
-- DPLL0 Lock Rise
DPLL0LCKR : Boolean := False;
-- DPLL0 Lock Fall
DPLL0LCKF : Boolean := False;
-- DPLL0 Lock Timeout
DPLL0LTO : Boolean := False;
-- DPLL0 Loop Divider Ratio Update Complete
DPLL0LDRTO : Boolean := False;
-- unspecified
Reserved_20_23 : HAL.UInt4 := 16#0#;
-- DPLL1 Lock Rise
DPLL1LCKR : Boolean := False;
-- DPLL1 Lock Fall
DPLL1LCKF : Boolean := False;
-- DPLL1 Lock Timeout
DPLL1LTO : Boolean := False;
-- DPLL1 Loop Divider Ratio Update Complete
DPLL1LDRTO : Boolean := False;
-- unspecified
Reserved_28_31 : HAL.UInt4 := 16#0#;
end record
with Volatile_Full_Access, Size => 32,
Bit_Order => System.Low_Order_First;
for OSCCTRL_INTFLAG_Register use record
XOSCRDY at 0 range 0 .. 1;
XOSCFAIL at 0 range 2 .. 3;
Reserved_4_7 at 0 range 4 .. 7;
DFLLRDY at 0 range 8 .. 8;
DFLLOOB at 0 range 9 .. 9;
DFLLLCKF at 0 range 10 .. 10;
DFLLLCKC at 0 range 11 .. 11;
DFLLRCS at 0 range 12 .. 12;
Reserved_13_15 at 0 range 13 .. 15;
DPLL0LCKR at 0 range 16 .. 16;
DPLL0LCKF at 0 range 17 .. 17;
DPLL0LTO at 0 range 18 .. 18;
DPLL0LDRTO at 0 range 19 .. 19;
Reserved_20_23 at 0 range 20 .. 23;
DPLL1LCKR at 0 range 24 .. 24;
DPLL1LCKF at 0 range 25 .. 25;
DPLL1LTO at 0 range 26 .. 26;
DPLL1LDRTO at 0 range 27 .. 27;
Reserved_28_31 at 0 range 28 .. 31;
end record;
-- OSCCTRL_STATUS_XOSCRDY array
type OSCCTRL_STATUS_XOSCRDY_Field_Array is array (0 .. 1) of Boolean
with Component_Size => 1, Size => 2;
-- Type definition for OSCCTRL_STATUS_XOSCRDY
type OSCCTRL_STATUS_XOSCRDY_Field
(As_Array : Boolean := False)
is record
case As_Array is
when False =>
-- XOSCRDY as a value
Val : HAL.UInt2;
when True =>
-- XOSCRDY as an array
Arr : OSCCTRL_STATUS_XOSCRDY_Field_Array;
end case;
end record
with Unchecked_Union, Size => 2;
for OSCCTRL_STATUS_XOSCRDY_Field use record
Val at 0 range 0 .. 1;
Arr at 0 range 0 .. 1;
end record;
-- OSCCTRL_STATUS_XOSCFAIL array
type OSCCTRL_STATUS_XOSCFAIL_Field_Array is array (0 .. 1) of Boolean
with Component_Size => 1, Size => 2;
-- Type definition for OSCCTRL_STATUS_XOSCFAIL
type OSCCTRL_STATUS_XOSCFAIL_Field
(As_Array : Boolean := False)
is record
case As_Array is
when False =>
-- XOSCFAIL as a value
Val : HAL.UInt2;
when True =>
-- XOSCFAIL as an array
Arr : OSCCTRL_STATUS_XOSCFAIL_Field_Array;
end case;
end record
with Unchecked_Union, Size => 2;
for OSCCTRL_STATUS_XOSCFAIL_Field use record
Val at 0 range 0 .. 1;
Arr at 0 range 0 .. 1;
end record;
-- OSCCTRL_STATUS_XOSCCKSW array
type OSCCTRL_STATUS_XOSCCKSW_Field_Array is array (0 .. 1) of Boolean
with Component_Size => 1, Size => 2;
-- Type definition for OSCCTRL_STATUS_XOSCCKSW
type OSCCTRL_STATUS_XOSCCKSW_Field
(As_Array : Boolean := False)
is record
case As_Array is
when False =>
-- XOSCCKSW as a value
Val : HAL.UInt2;
when True =>
-- XOSCCKSW as an array
Arr : OSCCTRL_STATUS_XOSCCKSW_Field_Array;
end case;
end record
with Unchecked_Union, Size => 2;
for OSCCTRL_STATUS_XOSCCKSW_Field use record
Val at 0 range 0 .. 1;
Arr at 0 range 0 .. 1;
end record;
-- Status
type OSCCTRL_STATUS_Register is record
-- Read-only. XOSC 0 Ready
XOSCRDY : OSCCTRL_STATUS_XOSCRDY_Field;
-- Read-only. XOSC 0 Clock Failure Detector
XOSCFAIL : OSCCTRL_STATUS_XOSCFAIL_Field;
-- Read-only. XOSC 0 Clock Switch
XOSCCKSW : OSCCTRL_STATUS_XOSCCKSW_Field;
-- unspecified
Reserved_6_7 : HAL.UInt2;
-- Read-only. DFLL Ready
DFLLRDY : Boolean;
-- Read-only. DFLL Out Of Bounds
DFLLOOB : Boolean;
-- Read-only. DFLL Lock Fine
DFLLLCKF : Boolean;
-- Read-only. DFLL Lock Coarse
DFLLLCKC : Boolean;
-- Read-only. DFLL Reference Clock Stopped
DFLLRCS : Boolean;
-- unspecified
Reserved_13_15 : HAL.UInt3;
-- Read-only. DPLL0 Lock Rise
DPLL0LCKR : Boolean;
-- Read-only. DPLL0 Lock Fall
DPLL0LCKF : Boolean;
-- Read-only. DPLL0 Timeout
DPLL0TO : Boolean;
-- Read-only. DPLL0 Loop Divider Ratio Update Complete
DPLL0LDRTO : Boolean;
-- unspecified
Reserved_20_23 : HAL.UInt4;
-- Read-only. DPLL1 Lock Rise
DPLL1LCKR : Boolean;
-- Read-only. DPLL1 Lock Fall
DPLL1LCKF : Boolean;
-- Read-only. DPLL1 Timeout
DPLL1TO : Boolean;
-- Read-only. DPLL1 Loop Divider Ratio Update Complete
DPLL1LDRTO : Boolean;
-- unspecified
Reserved_28_31 : HAL.UInt4;
end record
with Volatile_Full_Access, Size => 32,
Bit_Order => System.Low_Order_First;
for OSCCTRL_STATUS_Register use record
XOSCRDY at 0 range 0 .. 1;
XOSCFAIL at 0 range 2 .. 3;
XOSCCKSW at 0 range 4 .. 5;
Reserved_6_7 at 0 range 6 .. 7;
DFLLRDY at 0 range 8 .. 8;
DFLLOOB at 0 range 9 .. 9;
DFLLLCKF at 0 range 10 .. 10;
DFLLLCKC at 0 range 11 .. 11;
DFLLRCS at 0 range 12 .. 12;
Reserved_13_15 at 0 range 13 .. 15;
DPLL0LCKR at 0 range -- See the reference manual of your device for more information on the
-- configuration of DFLL.
16 .. 16;
DPLL0LCKF at 0 range 17 .. 17;
DPLL0TO at 0 range 18 .. 18;
DPLL0LDRTO at 0 range 19 .. 19;
Reserved_20_23 at 0 range 20 .. 23;
DPLL1LCKR at 0 range 24 .. 24;
DPLL1LCKF at 0 range 25 .. 25;
DPLL1TO at 0 range 26 .. 26;
DPLL1LDRTO at 0 range 27 .. 27;
Reserved_28_31 at 0 range 28 .. 31;
end record;
subtype OSCCTRL_XOSCCTRL_IPTAT_Field is HAL.UInt2;
subtype OSCCTRL_XOSCCTRL_IMULT_Field is HAL.UInt4;
subtype OSCCTRL_XOSCCTRL_STARTUP_Field is HAL.UInt4;
subtype OSCCTRL_XOSCCTRL_CFDPRESC_Field is HAL.UInt4;
-- External Multipurpose Crystal Oscillator Control
type OSCCTRL_XOSCCTRL_Register is record
-- unspecified
Reserved_0_0 : HAL.Bit := 16#0#;
-- Oscillator Enable
ENABLE : Boolean := False;
-- Crystal Oscillator Enable
XTALEN : Boolean := False;
-- unspecified
Reserved_3_5 : HAL.UInt3 := 16#0#;
-- Run in Standby
RUNSTDBY : Boolean := False;
-- On Demand Control
ONDEMAND : Boolean := True;
-- Low Buffer Gain Enable
LOWBUFGAIN : Boolean := False;
-- Oscillator Current Reference
IPTAT : OSCCTRL_XOSCCTRL_IPTAT_Field := 16#0#;
-- Oscillator Current Multiplier
IMULT : OSCCTRL_XOSCCTRL_IMULT_Field := 16#0#;
-- Automatic Loop Control Enable
ENALC : Boolean := False;
-- Clock Failure Detector Enable
CFDEN : Boolean := False;
-- Xosc Clock Switch Enable
SWBEN : Boolean := False;
-- unspecified
Reserved_18_19 : HAL.UInt2 := 16#0#;
-- Start-Up Time
STARTUP : OSCCTRL_XOSCCTRL_STARTUP_Field := 16#0#;
-- Clock Failure Detector Prescaler
CFDPRESC : OSCCTRL_XOSCCTRL_CFDPRESC_Field := 16#0#;
-- unspecified
Reserved_28_31 : HAL.UInt4 := 16#0#;
end record
with Volatile_Full_Access, Size => 32,
Bit_Order => System.Low_Order_First;
for OSCCTRL_XOSCCTRL_Register use record
Reserved_0_0 at 0 range 0 .. 0;
ENABLE at 0 range 1 .. 1;
XTALEN at 0 range 2 .. 2;
Reserved_3_5 at 0 range 3 .. 5;
RUNSTDBY at 0 range 6 .. 6;
ONDEMAND at 0 range 7 .. 7;
LOWBUFGAIN at 0 range 8 .. 8;
IPTAT at 0 range 9 .. 10;
IMULT at 0 range 11 .. 14;
ENALC at 0 range 15 .. 15;
CFDEN at 0 range 16 .. 16;
SWBEN at 0 range 17 .. 17;
Reserved_18_19 at 0 range 18 .. 19;
STARTUP at 0 range 20 .. 23;
CFDPRESC at 0 range 24 .. 27;
Reserved_28_31 at 0 range 28 .. 31;
end record;
-- External Multipurpose Crystal Oscillator Control
type OSCCTRL_XOSCCTRL_Registers is array (0 .. 1)
of OSCCTRL_XOSCCTRL_Register;
-- DFLL48M Control A
type OSCCTRL_DFLLCTRLA_Register is record
-- unspecified
Reserved_0_0 : HAL.Bit := 16#0#;
-- DFLL Enable
ENABLE : Boolean := True;
-- unspecified
Reserved_2_5 : HAL.UInt4 := 16#0#;
-- Run in Standby
RUNSTDBY : Boolean := False;
-- On Demand Control
ONDEMAND : Boolean := True;
end record
with Volatile_Full_Access, Size => 8, Bit_Order => System.Low_Order_First;
for OSCCTRL_DFLLCTRLA_Register use record
Reserved_0_0 at 0 range 0 .. 0;
ENABLE at 0 range 1 .. 1;
Reserved_2_5 at 0 range 2 .. 5;
RUNSTDBY at 0 range 6 .. 6;
ONDEMAND at 0 range 7 .. 7;
end record;
-- DFLL48M Control B
type OSCCTRL_DFLLCTRLB_Register is record
-- Operating Mode Selection
MODE : Boolean := False;
-- Stable DFLL Frequency
STABLE : Boolean := False;
-- Lose Lock After Wake
LLAW : Boolean := False;
-- USB Clock Recovery Mode
USBCRM : Boolean := False;
-- Chill Cycle Disable
CCDIS : Boolean := False;
-- Quick Lock Disable
QLDIS : Boolean := False;
-- Bypass Coarse Lock
BPLCKC : Boolean := False;
-- Wait Lock
WAITLOCK : Boolean := False;
end record
with Volatile_Full_Access, Size => 8, Bit_Order => System.Low_Order_First;
for OSCCTRL_DFLLCTRLB_Register use record
MODE at 0 range 0 .. 0;
STABLE at 0 range 1 .. 1;
LLAW at 0 range 2 .. 2;
USBCRM at 0 range 3 .. 3;
CCDIS at 0 range 4 .. 4;
QLDIS at 0 range 5 .. 5;
BPLCKC at 0 range 6 .. 6;
WAITLOCK at 0 range 7 .. 7;
end record;
subtype OSCCTRL_DFLLVAL_FINE_Field is HAL.UInt8;
subtype OSCCTRL_DFLLVAL_COARSE_Field is HAL.UInt6;
subtype OSCCTRL_DFLLVAL_DIFF_Field is HAL.UInt16;
-- DFLL48M Value
type OSCCTRL_DFLLVAL_Register is record
-- Fine Value
FINE : OSCCTRL_DFLLVAL_FINE_Field := 16#0#;
-- unspecified
Reserved_8_9 : HAL.UInt2 := 16#0#;
-- Coarse Value
COARSE : OSCCTRL_DFLLVAL_COARSE_Field := 16#0#;
-- Read-only. Multiplication Ratio Difference
DIFF : OSCCTRL_DFLLVAL_DIFF_Field := 16#0#;
end record
with Volatile_Full_Access, Size => 32,
Bit_Order => System.Low_Order_First;
for OSCCTRL_DFLLVAL_Register use record
FINE at 0 range 0 .. 7;
Reserved_8_9 at 0 range 8 .. 9;
COARSE at 0 range 10 .. 15;
DIFF at 0 range 16 .. 31;
end record;
subtype OSCCTRL_DFLLMUL_MUL_Field is HAL.UInt16;
subtype OSCCTRL_DFLLMUL_FSTEP_Field is HAL.UInt8;
subtype OSCCTRL_DFLLMUL_CSTEP_Field is HAL.UInt6;
-- DFLL48M Multiplier
type OSCCTRL_DFLLMUL_Register is record
-- DFLL Multiply Factor
MUL : OSCCTRL_DFLLMUL_MUL_Field := 16#0#;
-- Fine Maximum Step
FSTEP : OSCCTRL_DFLLMUL_FSTEP_Field := 16#0#;
-- unspecified
Reserved_24_25 : HAL.UInt2 := 16#0#;
-- Coarse Maximum Step
CSTEP : OSCCTRL_DFLLMUL_CSTEP_Field := 16#0#;
end record
with Volatile_Full_Access, Size => 32,
Bit_Order => System.Low_Order_First;
for OSCCTRL_DFLLMUL_Register use record
MUL at 0 range 0 .. 15;
FSTEP at 0 range 16 .. 23;
Reserved_24_25 at 0 range 24 .. 25;
CSTEP at 0 range 26 .. 31;
end record;
-- DFLL48M Synchronization
type OSCCTRL_DFLLSYNC_Register is record
-- unspecified
Reserved_0_0 : HAL.Bit;
-- Read-only. ENABLE Synchronization Busy
ENABLE : Boolean;
-- Read-only. DFLLCTRLB Synchronization Busy
DFLLCTRLB : Boolean;
-- Read-only. DFLLVAL Synchronization Busy
DFLLVAL : Boolean;
-- Read-only. DFLLMUL Synchronization Busy
DFLLMUL : Boolean;
-- unspecified
Reserved_5_7 : HAL.UInt3;
end record
with Volatile_Full_Access, Size => 8, Bit_Order => System.Low_Order_First;
for OSCCTRL_DFLLSYNC_Register use record
Reserved_0_0 at 0 range 0 .. 0;
ENABLE at 0 range 1 .. 1;
DFLLCTRLB at 0 range 2 .. 2;
DFLLVAL at 0 range 3 .. 3;
DFLLMUL at 0 range 4 .. 4;
Reserved_5_7 at 0 range 5 .. 7;
end record;
-- DPLL Control A
type DPLLCTRLA_Register is record
-- unspecified
Reserved_0_0 : HAL.Bit := 16#0#;
-- DPLL Enable
ENABLE : Boolean := False;
-- unspecified
Reserved_2_5 : HAL.UInt4 := 16#0#;
-- Run in Standby
RUNSTDBY : Boolean := False;
-- On Demand Control
ONDEMAND : Boolean := True;
end record
with Volatile_Full_Access, Size => 8, Bit_Order => System.Low_Order_First;
for DPLLCTRLA_Register use record
Reserved_0_0 at 0 range 0 .. 0;
ENABLE at 0 range 1 .. 1;
Reserved_2_5 at 0 range 2 .. 5;
RUNSTDBY at 0 range 6 .. 6;
ONDEMAND at 0 range 7 .. 7;
end record;
subtype DPLLRATIO_LDR_Field is HAL.UInt13;
subtype DPLLRATIO_LDRFRAC_Field is HAL.UInt5;
-- DPLL Ratio Control
type DPLLRATIO_Register is record
-- Loop Divider Ratio
LDR : DPLLRATIO_LDR_Field := 16#0#;
-- unspecified
Reserved_13_15 : HAL.UInt3 := 16#0#;
-- Loop Divider Ratio Fractional Part
LDRFRAC : DPLLRATIO_LDRFRAC_Field := 16#0#;
-- unspecified
Reserved_21_31 : HAL.UInt11 := 16#0#;
end record
with Volatile_Full_Access, Size => 32,
Bit_Order => System.Low_Order_First;
for DPLLRATIO_Register use record
LDR at 0 range 0 .. 12;
Reserved_13_15 at 0 range 13 .. 15;
LDRFRAC at 0 range 16 .. 20;
Reserved_21_31 at 0 range 21 .. 31;
end record;
subtype DPLLCTRLB_FILTER_Field is HAL.UInt4;
-- Reference Clock Selection
type DPLLCTRLB0_REFCLKSelect is
(-- Dedicated GCLK clock reference
Gclk,
-- XOSC32K clock reference
Xosc32,
-- XOSC0 clock reference
Xosc0,
-- XOSC1 clock reference
Xosc1)
with Size => 3;
for DPLLCTRLB0_REFCLKSelect use
(Gclk => 0,
Xosc32 => 1,
Xosc0 => 2,
Xosc1 => 3);
-- Lock Time
type DPLLCTRLB0_LTIMESelect is
(-- No time-out. Automatic lock
Default,
-- Time-out if no lock within 800us
Val_800Us,
-- Time-out if no lock within 900us
Val_900Us,
-- Time-out if no lock within 1ms
Val_1Ms,
-- Time-out if no lock within 1.1ms
Val_1P1Ms)
with Size => 3;
for DPLLCTRLB0_LTIMESelect use
(Default => 0,
Val_800Us => 4,
Val_900Us => 5,
Val_1Ms => 6,
Val_1P1Ms => 7);
subtype DPLLCTRLB_DCOFILTER_Field is HAL.UInt3;
subtype DPLLCTRLB_DIV_Field is HAL.UInt11;
-- DPLL Control B
type DPLLCTRLB_Register is record
-- Proportional Integral Filter Selection
FILTER : DPLLCTRLB_FILTER_Field := 16#0#;
-- Wake Up Fast
WUF : Boolean := False;
-- Reference Clock Selection
REFCLK : DPLLCTRLB0_REFCLKSelect := SAM_SVD.OSCCTRL.Xosc32;
-- Lock Time
LTIME : DPLLCTRLB0_LTIMESelect := SAM_SVD.OSCCTRL.Default;
-- Lock Bypass
LBYPASS : Boolean := False;
-- Sigma-Delta DCO Filter Selection
DCOFILTER : DPLLCTRLB_DCOFILTER_Field := 16#0#;
-- DCO Filter Enable
DCOEN : Boolean := False;
-- Clock Divider
DIV : DPLLCTRLB_DIV_Field := 16#0#;
-- unspecified
Reserved_27_31 : HAL.UInt5 := 16#0#;
end record
with Volatile_Full_Access, Size => 32,
Bit_Order => System.Low_Order_First;
for DPLLCTRLB_Register use record
FILTER at 0 range 0 .. 3;
WUF at 0 range 4 .. 4;
REFCLK at 0 range 5 .. 7;
LTIME at 0 range 8 .. 10;
LBYPASS at 0 range 11 .. 11;
DCOFILTER at 0 range 12 .. 14;
DCOEN at 0 range 15 .. 15;
DIV at 0 range 16 .. 26;
Reserved_27_31 at 0 range 27 .. 31;
end record;
-- DPLL Synchronization Busy
type DPLLSYNCBUSY_Register is record
-- unspecified
Reserved_0_0 : HAL.Bit;
-- Read-only. DPLL Enable Synchronization Status
ENABLE : Boolean;
-- Read-only. DPLL Loop Divider Ratio Synchronization Status
DPLLRATIO : Boolean;
-- unspecified
Reserved_3_31 : HAL.UInt29;
end record
with Volatile_Full_Access, Size => 32,
Bit_Order => System.Low_Order_First;
for DPLLSYNCBUSY_Register use record
Reserved_0_0 at 0 range 0 .. 0;
ENABLE at 0 range 1 .. 1;
DPLLRATIO at 0 range 2 .. 2;
Reserved_3_31 at 0 range 3 .. 31;
end record;
-- DPLL Status
type DPLLSTATUS_Register is record
-- Read-only. DPLL Lock Status
LOCK : Boolean;
-- Read-only. DPLL Clock Ready
CLKRDY : Boolean;
-- unspecified
Reserved_2_31 : HAL.UInt30;
end record
with Volatile_Full_Access, Size => 32,
Bit_Order => System.Low_Order_First;
for DPLLSTATUS_Register use record
LOCK at 0 range 0 .. 0;
CLKRDY at 0 range 1 .. 1;
Reserved_2_31 at 0 range 2 .. 31;
end record;
-----------------
-- Peripherals --
-----------------
-- Oscillators Control
type OSCCTRL_Peripheral is record
-- Event Control
EVCTRL : aliased OSCCTRL_EVCTRL_Register;
-- Interrupt Enable Clear
INTENCLR : aliased OSCCTRL_INTENCLR_Register;
-- Interrupt Enable Set
INTENSET : aliased OSCCTRL_INTENSET_Register;
-- Interrupt Flag Status and Clear
INTFLAG : aliased OSCCTRL_INTFLAG_Register;
-- Status
STATUS : aliased OSCCTRL_STATUS_Register;
-- External Multipurpose Crystal Oscillator Control
XOSCCTRL : aliased OSCCTRL_XOSCCTRL_Registers;
-- DFLL48M Control A
DFLLCTRLA : aliased OSCCTRL_DFLLCTRLA_Register;
-- DFLL48M Control B
DFLLCTRLB : aliased OSCCTRL_DFLLCTRLB_Register;
-- DFLL48M Value
DFLLVAL : aliased OSCCTRL_DFLLVAL_Register;
-- DFLL48M Multiplier
DFLLMUL : aliased OSCCTRL_DFLLMUL_Register;
-- DFLL48M Synchronization
DFLLSYNC : aliased OSCCTRL_DFLLSYNC_Register;
-- DPLL Control A
DPLLCTRLA0 : aliased DPLLCTRLA_Register;
-- DPLL Ratio Control
DPLLRATIO0 : aliased DPLLRATIO_Register;
-- DPLL Control B
DPLLCTRLB0 : aliased DPLLCTRLB_Register;
-- DPLL Synchronization Busy
DPLLSYNCBUSY0 : aliased DPLLSYNCBUSY_Register;
-- DPLL Status
DPLLSTATUS0 : aliased DPLLSTATUS_Register;
-- DPLL Control A
DPLLCTRLA1 : aliased DPLLCTRLA_Register;
-- DPLL Ratio Control
DPLLRATIO1 : aliased DPLLRATIO_Register;
-- DPLL Control B
DPLLCTRLB1 : aliased DPLLCTRLB_Register;
-- DPLL Synchronization Busy
DPLLSYNCBUSY1 : aliased DPLLSYNCBUSY_Register;
-- DPLL Status
DPLLSTATUS1 : aliased DPLLSTATUS_Register;
end record
with Volatile;
for OSCCTRL_Peripheral use record
EVCTRL at 16#0# range 0 .. 7;
INTENCLR at 16#4# range 0 .. 31;
INTENSET at 16#8# range 0 .. 31;
INTFLAG at 16#C# range 0 .. 31;
STATUS at 16#10# range 0 .. 31;
XOSCCTRL at 16#14# range 0 .. 63;
DFLLCTRLA at 16#1C# range 0 .. 7;
DFLLCTRLB at 16#20# range 0 .. 7;
DFLLVAL at 16#24# range 0 .. 31;
DFLLMUL at 16#28# range 0 .. 31;
DFLLSYNC at 16#2C# range 0 .. 7;
DPLLCTRLA0 at 16#30# range 0 .. 7;
DPLLRATIO0 at 16#34# range 0 .. 31;
DPLLCTRLB0 at 16#38# range 0 .. 31;
DPLLSYNCBUSY0 at 16#3C# range 0 .. 31;
DPLLSTATUS0 at 16#40# range 0 .. 31;
DPLLCTRLA1 at 16#44# range 0 .. 7;
DPLLRATIO1 at 16#48# range 0 .. 31;
DPLLCTRLB1 at 16#4C# range 0 .. 31;
DPLLSYNCBUSY1 at 16#50# range 0 .. 31;
DPLLSTATUS1 at 16#54# range 0 .. 31;
end record;
-- Oscillators Control
OSCCTRL_Periph : aliased OSCCTRL_Peripheral
with Import, Address => OSCCTRL_Base;
end SAM_SVD.OSCCTRL;
|
reznikmm/matreshka | Ada | 3,624 | ads | ------------------------------------------------------------------------------
-- --
-- Matreshka Project --
-- --
-- Ada Modeling Framework --
-- --
-- Runtime Library Component --
-- --
------------------------------------------------------------------------------
-- --
-- Copyright © 2011-2012, Vadim Godunko <[email protected]> --
-- All rights reserved. --
-- --
-- Redistribution and use in source and binary forms, with or without --
-- modification, are permitted provided that the following conditions --
-- are met: --
-- --
-- * Redistributions of source code must retain the above copyright --
-- notice, this list of conditions and the following disclaimer. --
-- --
-- * Redistributions in binary form must reproduce the above copyright --
-- notice, this list of conditions and the following disclaimer in the --
-- documentation and/or other materials provided with the distribution. --
-- --
-- * Neither the name of the Vadim Godunko, IE nor the names of its --
-- contributors may be used to endorse or promote products derived from --
-- this software without specific prior written permission. --
-- --
-- THIS SOFTWARE IS PROVIDED BY THE COPYRIGHT HOLDERS AND CONTRIBUTORS --
-- "AS IS" AND ANY EXPRESS OR IMPLIED WARRANTIES, INCLUDING, BUT NOT --
-- LIMITED TO, THE IMPLIED WARRANTIES OF MERCHANTABILITY AND FITNESS FOR --
-- A PARTICULAR PURPOSE ARE DISCLAIMED. IN NO EVENT SHALL THE COPYRIGHT --
-- HOLDER OR CONTRIBUTORS BE LIABLE FOR ANY DIRECT, INDIRECT, INCIDENTAL, --
-- SPECIAL, EXEMPLARY, OR CONSEQUENTIAL DAMAGES (INCLUDING, BUT NOT LIMITED --
-- TO, PROCUREMENT OF SUBSTITUTE GOODS OR SERVICES; LOSS OF USE, DATA, OR --
-- PROFITS; OR BUSINESS INTERRUPTION) HOWEVER CAUSED AND ON ANY THEORY OF --
-- LIABILITY, WHETHER IN CONTRACT, STRICT LIABILITY, OR TORT (INCLUDING --
-- NEGLIGENCE OR OTHERWISE) ARISING IN ANY WAY OUT OF THE USE OF THIS --
-- SOFTWARE, EVEN IF ADVISED OF THE POSSIBILITY OF SUCH DAMAGE. --
-- --
------------------------------------------------------------------------------
-- $Revision$ $Date$
------------------------------------------------------------------------------
-- This file is generated, don't edit it.
------------------------------------------------------------------------------
with AMF.Elements.Generic_Hash;
function AMF.UML.Time_Observations.Hash is
new AMF.Elements.Generic_Hash (UML_Time_Observation, UML_Time_Observation_Access);
|
MinimSecure/unum-sdk | Ada | 848 | adb | -- Copyright 2012-2019 Free Software Foundation, Inc.
--
-- This program is free software; you can redistribute it and/or modify
-- it under the terms of the GNU General Public License as published by
-- the Free Software Foundation; either version 3 of the License, or
-- (at your option) any later version.
--
-- This program is distributed in the hope that it will be useful,
-- but WITHOUT ANY WARRANTY; without even the implied warranty of
-- MERCHANTABILITY or FITNESS FOR A PARTICULAR PURPOSE. See the
-- GNU General Public License for more details.
--
-- You should have received a copy of the GNU General Public License
-- along with this program. If not, see <http://www.gnu.org/licenses/>.
with Pck; use Pck;
procedure P is
A : Action;
begin
A := Get_Action;
if A = Archive then
Archive;
end if;
end P;
|
zhmu/ananas | Ada | 49,011 | adb | ------------------------------------------------------------------------------
-- --
-- GNAT COMPILER COMPONENTS --
-- --
-- S E M _ A U X --
-- --
-- B o d y --
-- --
-- Copyright (C) 1992-2022, Free Software Foundation, Inc. --
-- --
-- GNAT is free software; you can redistribute it and/or modify it under --
-- terms of the GNU General Public License as published by the Free Soft- --
-- ware Foundation; either version 3, or (at your option) any later ver- --
-- sion. GNAT is distributed in the hope that it will be useful, but WITH- --
-- OUT ANY WARRANTY; without even the implied warranty of MERCHANTABILITY --
-- or FITNESS FOR A PARTICULAR PURPOSE. See the GNU General Public License --
-- for more details. You should have received a copy of the GNU General --
-- Public License distributed with GNAT; see file COPYING3. If not, go to --
-- http://www.gnu.org/licenses for a complete copy of the license. --
-- --
-- GNAT was originally developed by the GNAT team at New York University. --
-- Extensive contributions were provided by Ada Core Technologies Inc. --
-- --
------------------------------------------------------------------------------
with Atree; use Atree;
with Einfo; use Einfo;
with Einfo.Entities; use Einfo.Entities;
with Einfo.Utils; use Einfo.Utils;
with Nlists; use Nlists;
with Sinfo; use Sinfo;
with Sinfo.Nodes; use Sinfo.Nodes;
with Sinfo.Utils; use Sinfo.Utils;
with Snames; use Snames;
with Stand; use Stand;
with Uintp; use Uintp;
package body Sem_Aux is
----------------------
-- Ancestor_Subtype --
----------------------
function Ancestor_Subtype (Typ : Entity_Id) return Entity_Id is
begin
-- If this is first subtype, or is a base type, then there is no
-- ancestor subtype, so we return Empty to indicate this fact.
if Is_First_Subtype (Typ) or else Is_Base_Type (Typ) then
return Empty;
end if;
declare
D : constant Node_Id := Declaration_Node (Typ);
begin
-- If we have a subtype declaration, get the ancestor subtype
if Nkind (D) = N_Subtype_Declaration then
if Nkind (Subtype_Indication (D)) = N_Subtype_Indication then
return Entity (Subtype_Mark (Subtype_Indication (D)));
else
return Entity (Subtype_Indication (D));
end if;
-- If not, then no subtype indication is available
else
return Empty;
end if;
end;
end Ancestor_Subtype;
--------------------
-- Available_View --
--------------------
function Available_View (Ent : Entity_Id) return Entity_Id is
begin
-- Obtain the non-limited view (if available)
if Has_Non_Limited_View (Ent) then
return Get_Full_View (Non_Limited_View (Ent));
-- In all other cases, return entity unchanged
else
return Ent;
end if;
end Available_View;
--------------------
-- Constant_Value --
--------------------
function Constant_Value (Ent : Entity_Id) return Node_Id is
D : constant Node_Id := Declaration_Node (Ent);
Full_D : Node_Id;
begin
-- If we have no declaration node, then return no constant value. Not
-- clear how this can happen, but it does sometimes and this is the
-- safest approach.
if No (D) then
return Empty;
-- Normal case where a declaration node is present
elsif Nkind (D) = N_Object_Renaming_Declaration then
return Renamed_Object (Ent);
-- If this is a component declaration whose entity is a constant, it is
-- a prival within a protected function (and so has no constant value).
elsif Nkind (D) = N_Component_Declaration then
return Empty;
-- If there is an expression, return it
elsif Present (Expression (D)) then
return Expression (D);
-- For a constant, see if we have a full view
elsif Ekind (Ent) = E_Constant
and then Present (Full_View (Ent))
then
Full_D := Parent (Full_View (Ent));
-- The full view may have been rewritten as an object renaming
if Nkind (Full_D) = N_Object_Renaming_Declaration then
return Name (Full_D);
else
return Expression (Full_D);
end if;
-- Otherwise we have no expression to return
else
return Empty;
end if;
end Constant_Value;
---------------------------------
-- Corresponding_Unsigned_Type --
---------------------------------
function Corresponding_Unsigned_Type (Typ : Entity_Id) return Entity_Id is
pragma Assert (Is_Signed_Integer_Type (Typ));
Siz : constant Uint := Esize (Base_Type (Typ));
begin
if Siz = Esize (Standard_Short_Short_Integer) then
return Standard_Short_Short_Unsigned;
elsif Siz = Esize (Standard_Short_Integer) then
return Standard_Short_Unsigned;
elsif Siz = Esize (Standard_Unsigned) then
return Standard_Unsigned;
elsif Siz = Esize (Standard_Long_Integer) then
return Standard_Long_Unsigned;
elsif Siz = Esize (Standard_Long_Long_Integer) then
return Standard_Long_Long_Unsigned;
elsif Siz = Esize (Standard_Long_Long_Long_Integer) then
return Standard_Long_Long_Long_Unsigned;
else
raise Program_Error;
end if;
end Corresponding_Unsigned_Type;
-----------------------------
-- Enclosing_Dynamic_Scope --
-----------------------------
function Enclosing_Dynamic_Scope (Ent : Entity_Id) return Entity_Id is
S : Entity_Id;
begin
-- The following test is an error defense against some syntax errors
-- that can leave scopes very messed up.
if Ent = Standard_Standard then
return Ent;
end if;
-- Normal case, search enclosing scopes
-- Note: the test for Present (S) should not be required, it defends
-- against an ill-formed tree.
S := Scope (Ent);
loop
-- If we somehow got an empty value for Scope, the tree must be
-- malformed. Rather than blow up we return Standard in this case.
if No (S) then
return Standard_Standard;
-- Quit if we get to standard or a dynamic scope. We must also
-- handle enclosing scopes that have a full view; required to
-- locate enclosing scopes that are synchronized private types
-- whose full view is a task type.
elsif S = Standard_Standard
or else Is_Dynamic_Scope (S)
or else (Is_Private_Type (S)
and then Present (Full_View (S))
and then Is_Dynamic_Scope (Full_View (S)))
then
return S;
-- Otherwise keep climbing
else
S := Scope (S);
end if;
end loop;
end Enclosing_Dynamic_Scope;
------------------------
-- First_Discriminant --
------------------------
function First_Discriminant (Typ : Entity_Id) return Entity_Id is
Ent : Entity_Id;
begin
pragma Assert
(Has_Discriminants (Typ) or else Has_Unknown_Discriminants (Typ));
Ent := First_Entity (Typ);
-- The discriminants are not necessarily contiguous, because access
-- discriminants will generate itypes. They are not the first entities
-- either because the tag must be ahead of them.
if Chars (Ent) = Name_uTag then
Next_Entity (Ent);
end if;
-- Skip all hidden stored discriminants if any
while Present (Ent) loop
exit when Ekind (Ent) = E_Discriminant
and then not Is_Completely_Hidden (Ent);
Next_Entity (Ent);
end loop;
-- Call may be on a private type with unknown discriminants, in which
-- case Ent is Empty, and as per the spec, we return Empty in this case.
-- Historical note: The assertion in previous versions that Ent is a
-- discriminant was overly cautious and prevented convenient application
-- of this function in the gnatprove context.
return Ent;
end First_Discriminant;
-------------------------------
-- First_Stored_Discriminant --
-------------------------------
function First_Stored_Discriminant (Typ : Entity_Id) return Entity_Id is
Ent : Entity_Id;
function Has_Completely_Hidden_Discriminant
(Typ : Entity_Id) return Boolean;
-- Scans the Discriminants to see whether any are Completely_Hidden
-- (the mechanism for describing non-specified stored discriminants)
-- Note that the entity list for the type may contain anonymous access
-- types created by expressions that constrain access discriminants.
----------------------------------------
-- Has_Completely_Hidden_Discriminant --
----------------------------------------
function Has_Completely_Hidden_Discriminant
(Typ : Entity_Id) return Boolean
is
Ent : Entity_Id;
begin
pragma Assert (Ekind (Typ) = E_Discriminant);
Ent := Typ;
while Present (Ent) loop
-- Skip anonymous types that may be created by expressions
-- used as discriminant constraints on inherited discriminants.
if Is_Itype (Ent) then
null;
elsif Ekind (Ent) = E_Discriminant
and then Is_Completely_Hidden (Ent)
then
return True;
end if;
Next_Entity (Ent);
end loop;
return False;
end Has_Completely_Hidden_Discriminant;
-- Start of processing for First_Stored_Discriminant
begin
pragma Assert
(Has_Discriminants (Typ)
or else Has_Unknown_Discriminants (Typ));
Ent := First_Entity (Typ);
if Chars (Ent) = Name_uTag then
Next_Entity (Ent);
end if;
if Has_Completely_Hidden_Discriminant (Ent) then
while Present (Ent) loop
exit when Ekind (Ent) = E_Discriminant
and then Is_Completely_Hidden (Ent);
Next_Entity (Ent);
end loop;
end if;
pragma Assert (Ekind (Ent) = E_Discriminant);
return Ent;
end First_Stored_Discriminant;
-------------------
-- First_Subtype --
-------------------
function First_Subtype (Typ : Entity_Id) return Entity_Id is
B : constant Entity_Id := Base_Type (Typ);
F : Node_Id := Freeze_Node (B);
Ent : Entity_Id;
begin
-- The freeze node of a ghost type might have been rewritten in a null
-- statement by the time gigi calls First_Subtype on the corresponding
-- type.
if Nkind (F) = N_Null_Statement then
F := Original_Node (F);
end if;
-- If the base type has no freeze node, it is a type in Standard, and
-- always acts as its own first subtype, except where it is one of the
-- predefined integer types. If the type is formal, it is also a first
-- subtype, and its base type has no freeze node. On the other hand, a
-- subtype of a generic formal is not its own first subtype. Its base
-- type, if anonymous, is attached to the formal type declaration from
-- which the first subtype is obtained.
if No (F) then
if B = Base_Type (Standard_Integer) then
return Standard_Integer;
elsif B = Base_Type (Standard_Long_Integer) then
return Standard_Long_Integer;
elsif B = Base_Type (Standard_Short_Short_Integer) then
return Standard_Short_Short_Integer;
elsif B = Base_Type (Standard_Short_Integer) then
return Standard_Short_Integer;
elsif B = Base_Type (Standard_Long_Long_Integer) then
return Standard_Long_Long_Integer;
elsif B = Base_Type (Standard_Long_Long_Long_Integer) then
return Standard_Long_Long_Long_Integer;
elsif Is_Generic_Type (Typ) then
if Present (Parent (B)) then
return Defining_Identifier (Parent (B));
else
return Defining_Identifier (Associated_Node_For_Itype (B));
end if;
else
return B;
end if;
-- Otherwise we check the freeze node, if it has a First_Subtype_Link
-- then we use that link, otherwise (happens with some Itypes), we use
-- the base type itself.
else
Ent := First_Subtype_Link (F);
if Present (Ent) then
return Ent;
else
return B;
end if;
end if;
end First_Subtype;
-------------------------
-- First_Tag_Component --
-------------------------
function First_Tag_Component (Typ : Entity_Id) return Entity_Id is
Comp : Entity_Id;
Ctyp : Entity_Id;
begin
Ctyp := Typ;
pragma Assert (Is_Tagged_Type (Ctyp));
if Is_Class_Wide_Type (Ctyp) then
Ctyp := Root_Type (Ctyp);
end if;
if Is_Private_Type (Ctyp) then
Ctyp := Underlying_Type (Ctyp);
-- If the underlying type is missing then the source program has
-- errors and there is nothing else to do (the full-type declaration
-- associated with the private type declaration is missing).
if No (Ctyp) then
return Empty;
end if;
end if;
Comp := First_Entity (Ctyp);
while Present (Comp) loop
if Is_Tag (Comp) then
return Comp;
end if;
Next_Entity (Comp);
end loop;
-- No tag component found
return Empty;
end First_Tag_Component;
-----------------------
-- Get_Called_Entity --
-----------------------
function Get_Called_Entity (Call : Node_Id) return Entity_Id is
Nam : constant Node_Id := Name (Call);
Id : Entity_Id;
begin
if Nkind (Nam) = N_Explicit_Dereference then
Id := Etype (Nam);
pragma Assert (Ekind (Id) = E_Subprogram_Type);
elsif Nkind (Nam) = N_Selected_Component then
Id := Entity (Selector_Name (Nam));
elsif Nkind (Nam) = N_Indexed_Component then
Id := Entity (Selector_Name (Prefix (Nam)));
else
Id := Entity (Nam);
end if;
return Id;
end Get_Called_Entity;
------------------
-- Get_Rep_Item --
------------------
function Get_Rep_Item
(E : Entity_Id;
Nam : Name_Id;
Check_Parents : Boolean := True) return Node_Id
is
N : Node_Id;
begin
N := First_Rep_Item (E);
while Present (N) loop
-- Only one of Priority / Interrupt_Priority can be specified, so
-- return whichever one is present to catch illegal duplication.
if Nkind (N) = N_Pragma
and then
(Pragma_Name_Unmapped (N) = Nam
or else (Nam = Name_Priority
and then Pragma_Name (N) =
Name_Interrupt_Priority)
or else (Nam = Name_Interrupt_Priority
and then Pragma_Name (N) = Name_Priority))
then
if Check_Parents then
return N;
-- If Check_Parents is False, return N if the pragma doesn't
-- appear in the Rep_Item chain of the parent.
else
declare
Par : constant Entity_Id := Nearest_Ancestor (E);
-- This node represents the parent type of type E (if any)
begin
if No (Par) then
return N;
elsif not Present_In_Rep_Item (Par, N) then
return N;
end if;
end;
end if;
elsif Nkind (N) = N_Attribute_Definition_Clause
and then
(Chars (N) = Nam
or else (Nam = Name_Priority
and then Chars (N) = Name_Interrupt_Priority))
then
if Check_Parents or else Entity (N) = E then
return N;
end if;
elsif Nkind (N) = N_Aspect_Specification
and then
(Chars (Identifier (N)) = Nam
or else
(Nam = Name_Priority
and then Chars (Identifier (N)) = Name_Interrupt_Priority))
then
if Check_Parents then
return N;
elsif Entity (N) = E then
return N;
end if;
-- A Ghost-related aspect, if disabled, may have been replaced by a
-- null statement.
elsif Nkind (N) = N_Null_Statement then
N := Original_Node (N);
end if;
Next_Rep_Item (N);
end loop;
return Empty;
end Get_Rep_Item;
function Get_Rep_Item
(E : Entity_Id;
Nam1 : Name_Id;
Nam2 : Name_Id;
Check_Parents : Boolean := True) return Node_Id
is
Nam1_Item : constant Node_Id := Get_Rep_Item (E, Nam1, Check_Parents);
Nam2_Item : constant Node_Id := Get_Rep_Item (E, Nam2, Check_Parents);
N : Node_Id;
begin
-- Check both Nam1_Item and Nam2_Item are present
if No (Nam1_Item) then
return Nam2_Item;
elsif No (Nam2_Item) then
return Nam1_Item;
end if;
-- Return the first node encountered in the list
N := First_Rep_Item (E);
while Present (N) loop
if N = Nam1_Item or else N = Nam2_Item then
return N;
end if;
Next_Rep_Item (N);
end loop;
return Empty;
end Get_Rep_Item;
--------------------
-- Get_Rep_Pragma --
--------------------
function Get_Rep_Pragma
(E : Entity_Id;
Nam : Name_Id;
Check_Parents : Boolean := True) return Node_Id
is
N : constant Node_Id := Get_Rep_Item (E, Nam, Check_Parents);
begin
if Present (N) and then Nkind (N) = N_Pragma then
return N;
end if;
return Empty;
end Get_Rep_Pragma;
function Get_Rep_Pragma
(E : Entity_Id;
Nam1 : Name_Id;
Nam2 : Name_Id;
Check_Parents : Boolean := True) return Node_Id
is
Nam1_Item : constant Node_Id := Get_Rep_Pragma (E, Nam1, Check_Parents);
Nam2_Item : constant Node_Id := Get_Rep_Pragma (E, Nam2, Check_Parents);
N : Node_Id;
begin
-- Check both Nam1_Item and Nam2_Item are present
if No (Nam1_Item) then
return Nam2_Item;
elsif No (Nam2_Item) then
return Nam1_Item;
end if;
-- Return the first node encountered in the list
N := First_Rep_Item (E);
while Present (N) loop
if N = Nam1_Item or else N = Nam2_Item then
return N;
end if;
Next_Rep_Item (N);
end loop;
return Empty;
end Get_Rep_Pragma;
---------------------------------
-- Has_External_Tag_Rep_Clause --
---------------------------------
function Has_External_Tag_Rep_Clause (T : Entity_Id) return Boolean is
begin
pragma Assert (Is_Tagged_Type (T));
return Has_Rep_Item (T, Name_External_Tag, Check_Parents => False);
end Has_External_Tag_Rep_Clause;
------------------
-- Has_Rep_Item --
------------------
function Has_Rep_Item
(E : Entity_Id;
Nam : Name_Id;
Check_Parents : Boolean := True) return Boolean
is
begin
return Present (Get_Rep_Item (E, Nam, Check_Parents));
end Has_Rep_Item;
function Has_Rep_Item
(E : Entity_Id;
Nam1 : Name_Id;
Nam2 : Name_Id;
Check_Parents : Boolean := True) return Boolean
is
begin
return Present (Get_Rep_Item (E, Nam1, Nam2, Check_Parents));
end Has_Rep_Item;
--------------------
-- Has_Rep_Pragma --
--------------------
function Has_Rep_Pragma
(E : Entity_Id;
Nam : Name_Id;
Check_Parents : Boolean := True) return Boolean
is
begin
return Present (Get_Rep_Pragma (E, Nam, Check_Parents));
end Has_Rep_Pragma;
function Has_Rep_Pragma
(E : Entity_Id;
Nam1 : Name_Id;
Nam2 : Name_Id;
Check_Parents : Boolean := True) return Boolean
is
begin
return Present (Get_Rep_Pragma (E, Nam1, Nam2, Check_Parents));
end Has_Rep_Pragma;
--------------------------------
-- Has_Unconstrained_Elements --
--------------------------------
function Has_Unconstrained_Elements (T : Entity_Id) return Boolean is
U_T : constant Entity_Id := Underlying_Type (T);
begin
if No (U_T) then
return False;
elsif Is_Record_Type (U_T) then
return Has_Discriminants (U_T) and then not Is_Constrained (U_T);
elsif Is_Array_Type (U_T) then
return Has_Unconstrained_Elements (Component_Type (U_T));
else
return False;
end if;
end Has_Unconstrained_Elements;
----------------------
-- Has_Variant_Part --
----------------------
function Has_Variant_Part (Typ : Entity_Id) return Boolean is
FSTyp : Entity_Id;
Decl : Node_Id;
TDef : Node_Id;
CList : Node_Id;
begin
if not Is_Type (Typ) then
return False;
end if;
FSTyp := First_Subtype (Typ);
if not Has_Discriminants (FSTyp) then
return False;
end if;
-- Proceed with cautious checks here, return False if tree is not
-- as expected (may be caused by prior errors).
Decl := Declaration_Node (FSTyp);
if Nkind (Decl) /= N_Full_Type_Declaration then
return False;
end if;
TDef := Type_Definition (Decl);
if Nkind (TDef) /= N_Record_Definition then
return False;
end if;
CList := Component_List (TDef);
if Nkind (CList) /= N_Component_List then
return False;
else
return Present (Variant_Part (CList));
end if;
end Has_Variant_Part;
---------------------
-- In_Generic_Body --
---------------------
function In_Generic_Body (Id : Entity_Id) return Boolean is
S : Entity_Id;
begin
-- Climb scopes looking for generic body
S := Id;
while Present (S) and then S /= Standard_Standard loop
-- Generic package body
if Ekind (S) = E_Generic_Package
and then In_Package_Body (S)
then
return True;
-- Generic subprogram body
elsif Is_Subprogram (S)
and then Nkind (Unit_Declaration_Node (S)) =
N_Generic_Subprogram_Declaration
then
return True;
end if;
S := Scope (S);
end loop;
-- False if top of scope stack without finding a generic body
return False;
end In_Generic_Body;
-------------------------------
-- Initialization_Suppressed --
-------------------------------
function Initialization_Suppressed (Typ : Entity_Id) return Boolean is
begin
return Suppress_Initialization (Typ)
or else Suppress_Initialization (Base_Type (Typ));
end Initialization_Suppressed;
----------------
-- Initialize --
----------------
procedure Initialize is
begin
Obsolescent_Warnings.Init;
end Initialize;
-------------
-- Is_Body --
-------------
function Is_Body (N : Node_Id) return Boolean is
begin
return Nkind (N) in
N_Body_Stub | N_Entry_Body | N_Package_Body | N_Protected_Body |
N_Subprogram_Body | N_Task_Body;
end Is_Body;
---------------------
-- Is_By_Copy_Type --
---------------------
function Is_By_Copy_Type (Ent : Entity_Id) return Boolean is
begin
-- If Id is a private type whose full declaration has not been seen,
-- we assume for now that it is not a By_Copy type. Clearly this
-- attribute should not be used before the type is frozen, but it is
-- needed to build the associated record of a protected type. Another
-- place where some lookahead for a full view is needed ???
return
Is_Elementary_Type (Ent)
or else (Is_Private_Type (Ent)
and then Present (Underlying_Type (Ent))
and then Is_Elementary_Type (Underlying_Type (Ent)));
end Is_By_Copy_Type;
--------------------------
-- Is_By_Reference_Type --
--------------------------
function Is_By_Reference_Type (Ent : Entity_Id) return Boolean is
Btype : constant Entity_Id := Base_Type (Ent);
begin
if Is_Private_Type (Btype) then
declare
Utyp : constant Entity_Id := Underlying_Type (Btype);
begin
if No (Utyp) then
return False;
else
return Is_By_Reference_Type (Utyp);
end if;
end;
elsif Is_Incomplete_Type (Btype) then
declare
Ftyp : constant Entity_Id := Full_View (Btype);
begin
-- Return true for a tagged incomplete type built as a shadow
-- entity in Build_Limited_Views. It can appear in the profile
-- of a thunk and the back end needs to know how it is passed.
if No (Ftyp) then
return Is_Tagged_Type (Btype);
else
return Is_By_Reference_Type (Ftyp);
end if;
end;
elsif Is_Concurrent_Type (Btype) then
return True;
elsif Is_Record_Type (Btype) then
if Is_Limited_Record (Btype)
or else Is_Tagged_Type (Btype)
or else Is_Volatile (Btype)
then
return True;
else
declare
C : Entity_Id;
begin
C := First_Component (Btype);
while Present (C) loop
-- For each component, test if its type is a by reference
-- type and if its type is volatile. Also test the component
-- itself for being volatile. This happens for example when
-- a Volatile aspect is added to a component.
if Is_By_Reference_Type (Etype (C))
or else Is_Volatile (Etype (C))
or else Is_Volatile (C)
then
return True;
end if;
Next_Component (C);
end loop;
end;
return False;
end if;
elsif Is_Array_Type (Btype) then
return
Is_Volatile (Btype)
or else Is_By_Reference_Type (Component_Type (Btype))
or else Is_Volatile (Component_Type (Btype))
or else Has_Volatile_Components (Btype);
else
return False;
end if;
end Is_By_Reference_Type;
-------------------------
-- Is_Definite_Subtype --
-------------------------
function Is_Definite_Subtype (T : Entity_Id) return Boolean is
pragma Assert (Is_Type (T));
K : constant Entity_Kind := Ekind (T);
begin
if Is_Constrained (T) then
return True;
elsif K in Array_Kind
or else K in Class_Wide_Kind
or else Has_Unknown_Discriminants (T)
then
return False;
-- Known discriminants: definite if there are default values. Note that
-- if any discriminant has a default, they all do.
elsif Has_Discriminants (T) then
return Present (Discriminant_Default_Value (First_Discriminant (T)));
else
return True;
end if;
end Is_Definite_Subtype;
---------------------
-- Is_Derived_Type --
---------------------
function Is_Derived_Type (Ent : E) return B is
Par : Node_Id;
begin
if Is_Type (Ent)
and then Base_Type (Ent) /= Root_Type (Ent)
and then not Is_Class_Wide_Type (Ent)
-- An access_to_subprogram whose result type is a limited view can
-- appear in a return statement, without the full view of the result
-- type being available. Do not interpret this as a derived type.
and then Ekind (Ent) /= E_Subprogram_Type
then
if not Is_Numeric_Type (Root_Type (Ent)) then
return True;
else
Par := Parent (First_Subtype (Ent));
return Present (Par)
and then Nkind (Par) = N_Full_Type_Declaration
and then Nkind (Type_Definition (Par)) =
N_Derived_Type_Definition;
end if;
else
return False;
end if;
end Is_Derived_Type;
-----------------------
-- Is_Generic_Formal --
-----------------------
function Is_Generic_Formal (E : Entity_Id) return Boolean is
Kind : Node_Kind;
begin
if No (E) then
return False;
else
-- Formal derived types are rewritten as private extensions, so
-- examine original node.
Kind := Nkind (Original_Node (Parent (E)));
return
Kind in N_Formal_Object_Declaration | N_Formal_Type_Declaration
or else Is_Formal_Subprogram (E)
or else
(Ekind (E) = E_Package
and then Nkind (Original_Node (Unit_Declaration_Node (E))) =
N_Formal_Package_Declaration);
end if;
end Is_Generic_Formal;
-------------------------------
-- Is_Immutably_Limited_Type --
-------------------------------
function Is_Immutably_Limited_Type (Ent : Entity_Id) return Boolean is
Btype : constant Entity_Id := Available_View (Base_Type (Ent));
begin
if Is_Limited_Record (Btype) then
return True;
elsif Ekind (Btype) = E_Limited_Private_Type
and then Nkind (Parent (Btype)) = N_Formal_Type_Declaration
then
return not In_Package_Body (Scope ((Btype)));
elsif Is_Private_Type (Btype) then
-- AI05-0063: A type derived from a limited private formal type is
-- not immutably limited in a generic body.
if Is_Derived_Type (Btype)
and then Is_Generic_Type (Etype (Btype))
then
if not Is_Limited_Type (Etype (Btype)) then
return False;
-- A descendant of a limited formal type is not immutably limited
-- in the generic body, or in the body of a generic child.
elsif Ekind (Scope (Etype (Btype))) = E_Generic_Package then
return not In_Package_Body (Scope (Btype));
else
return False;
end if;
else
declare
Utyp : constant Entity_Id := Underlying_Type (Btype);
begin
if No (Utyp) then
return False;
else
return Is_Immutably_Limited_Type (Utyp);
end if;
end;
end if;
elsif Is_Concurrent_Type (Btype) then
return True;
else
return False;
end if;
end Is_Immutably_Limited_Type;
---------------------
-- Is_Limited_Type --
---------------------
function Is_Limited_Type (Ent : Entity_Id) return Boolean is
Btype : Entity_Id;
Rtype : Entity_Id;
begin
if not Is_Type (Ent) then
return False;
end if;
Btype := Base_Type (Ent);
Rtype := Root_Type (Btype);
if Ekind (Btype) = E_Limited_Private_Type
or else Is_Limited_Composite (Btype)
then
return True;
elsif Is_Concurrent_Type (Btype) then
return True;
-- The Is_Limited_Record flag normally indicates that the type is
-- limited. The exception is that a type does not inherit limitedness
-- from its interface ancestor. So the type may be derived from a
-- limited interface, but is not limited.
elsif Is_Limited_Record (Ent)
and then not Is_Interface (Ent)
then
return True;
-- Otherwise we will look around to see if there is some other reason
-- for it to be limited, except that if an error was posted on the
-- entity, then just assume it is non-limited, because it can cause
-- trouble to recurse into a murky entity resulting from other errors.
elsif Error_Posted (Ent) then
return False;
elsif Is_Record_Type (Btype) then
if Is_Limited_Interface (Ent) then
return True;
-- AI-419: limitedness is not inherited from a limited interface
elsif Is_Limited_Record (Rtype) then
return not Is_Interface (Rtype)
or else Is_Protected_Interface (Rtype)
or else Is_Synchronized_Interface (Rtype)
or else Is_Task_Interface (Rtype);
elsif Is_Class_Wide_Type (Btype) then
return Is_Limited_Type (Rtype);
else
declare
C : E;
begin
C := First_Component (Btype);
while Present (C) loop
if Is_Limited_Type (Etype (C)) then
return True;
end if;
Next_Component (C);
end loop;
end;
return False;
end if;
elsif Is_Array_Type (Btype) then
return Is_Limited_Type (Component_Type (Btype));
else
return False;
end if;
end Is_Limited_Type;
---------------------
-- Is_Limited_View --
---------------------
function Is_Limited_View (Ent : Entity_Id) return Boolean is
Btype : constant Entity_Id := Available_View (Base_Type (Ent));
begin
if Is_Limited_Record (Btype) then
return True;
elsif Ekind (Btype) = E_Limited_Private_Type
and then Nkind (Parent (Btype)) = N_Formal_Type_Declaration
then
return not In_Package_Body (Scope ((Btype)));
elsif Is_Private_Type (Btype) then
-- AI05-0063: A type derived from a limited private formal type is
-- not immutably limited in a generic body.
if Is_Derived_Type (Btype)
and then Is_Generic_Type (Etype (Btype))
then
if not Is_Limited_Type (Etype (Btype)) then
return False;
-- A descendant of a limited formal type is not immutably limited
-- in the generic body, or in the body of a generic child.
elsif Ekind (Scope (Etype (Btype))) = E_Generic_Package then
return not In_Package_Body (Scope (Btype));
else
return False;
end if;
else
declare
Utyp : constant Entity_Id := Underlying_Type (Btype);
begin
if No (Utyp) then
return False;
else
return Is_Limited_View (Utyp);
end if;
end;
end if;
elsif Is_Concurrent_Type (Btype) then
return True;
elsif Is_Record_Type (Btype) then
-- Note that we return True for all limited interfaces, even though
-- (unsynchronized) limited interfaces can have descendants that are
-- nonlimited, because this is a predicate on the type itself, and
-- things like functions with limited interface results need to be
-- handled as build in place even though they might return objects
-- of a type that is not inherently limited.
if Is_Class_Wide_Type (Btype) then
return Is_Limited_View (Root_Type (Btype));
else
declare
C : Entity_Id;
begin
C := First_Component (Btype);
while Present (C) loop
-- Don't consider components with interface types (which can
-- only occur in the case of a _parent component anyway).
-- They don't have any components, plus it would cause this
-- function to return true for nonlimited types derived from
-- limited interfaces.
if not Is_Interface (Etype (C))
and then Is_Limited_View (Etype (C))
then
return True;
end if;
Next_Component (C);
end loop;
end;
return False;
end if;
elsif Is_Array_Type (Btype) then
return Is_Limited_View (Component_Type (Btype));
else
return False;
end if;
end Is_Limited_View;
-------------------------------
-- Is_Record_Or_Limited_Type --
-------------------------------
function Is_Record_Or_Limited_Type (Typ : Entity_Id) return Boolean is
begin
return Is_Record_Type (Typ) or else Is_Limited_Type (Typ);
end Is_Record_Or_Limited_Type;
----------------------
-- Nearest_Ancestor --
----------------------
function Nearest_Ancestor (Typ : Entity_Id) return Entity_Id is
D : constant Node_Id := Original_Node (Declaration_Node (Typ));
-- We use the original node of the declaration, because derived
-- types from record subtypes are rewritten as record declarations,
-- and it is the original declaration that carries the ancestor.
begin
-- If we have a subtype declaration, get the ancestor subtype
if Nkind (D) = N_Subtype_Declaration then
if Nkind (Subtype_Indication (D)) = N_Subtype_Indication then
return Entity (Subtype_Mark (Subtype_Indication (D)));
else
return Entity (Subtype_Indication (D));
end if;
-- If derived type declaration, find who we are derived from
elsif Nkind (D) = N_Full_Type_Declaration
and then Nkind (Type_Definition (D)) = N_Derived_Type_Definition
then
declare
DTD : constant Entity_Id := Type_Definition (D);
SI : constant Entity_Id := Subtype_Indication (DTD);
begin
if Is_Entity_Name (SI) then
return Entity (SI);
else
return Entity (Subtype_Mark (SI));
end if;
end;
-- If this is a concurrent declaration with a nonempty interface list,
-- get the first progenitor. Account for case of a record type created
-- for a concurrent type (which is the only case that seems to occur
-- in practice).
elsif Nkind (D) = N_Full_Type_Declaration
and then (Is_Concurrent_Type (Defining_Identifier (D))
or else Is_Concurrent_Record_Type (Defining_Identifier (D)))
and then Is_Non_Empty_List (Interface_List (Type_Definition (D)))
then
return Entity (First (Interface_List (Type_Definition (D))));
-- If derived type and private type, get the full view to find who we
-- are derived from.
elsif Is_Derived_Type (Typ)
and then Is_Private_Type (Typ)
and then Present (Full_View (Typ))
then
return Nearest_Ancestor (Full_View (Typ));
-- Otherwise, nothing useful to return, return Empty
else
return Empty;
end if;
end Nearest_Ancestor;
---------------------------
-- Nearest_Dynamic_Scope --
---------------------------
function Nearest_Dynamic_Scope (Ent : Entity_Id) return Entity_Id is
begin
if Is_Dynamic_Scope (Ent) then
return Ent;
else
return Enclosing_Dynamic_Scope (Ent);
end if;
end Nearest_Dynamic_Scope;
------------------------
-- Next_Tag_Component --
------------------------
function Next_Tag_Component (Tag : Entity_Id) return Entity_Id is
Comp : Entity_Id;
begin
pragma Assert (Is_Tag (Tag));
-- Loop to look for next tag component
Comp := Next_Entity (Tag);
while Present (Comp) loop
if Is_Tag (Comp) then
pragma Assert (Chars (Comp) /= Name_uTag);
return Comp;
end if;
Next_Entity (Comp);
end loop;
-- No tag component found
return Empty;
end Next_Tag_Component;
--------------------------
-- Number_Discriminants --
--------------------------
function Number_Discriminants (Typ : Entity_Id) return Pos is
N : Nat := 0;
Discr : Entity_Id := First_Discriminant (Typ);
begin
while Present (Discr) loop
N := N + 1;
Next_Discriminant (Discr);
end loop;
return N;
end Number_Discriminants;
----------------------------------------------
-- Object_Type_Has_Constrained_Partial_View --
----------------------------------------------
function Object_Type_Has_Constrained_Partial_View
(Typ : Entity_Id;
Scop : Entity_Id) return Boolean
is
begin
return Has_Constrained_Partial_View (Typ)
or else (In_Generic_Body (Scop)
and then Is_Generic_Type (Base_Type (Typ))
and then (Is_Private_Type (Base_Type (Typ))
or else Is_Derived_Type (Base_Type (Typ)))
and then not Is_Tagged_Type (Typ)
and then not (Is_Array_Type (Typ)
and then not Is_Constrained (Typ))
and then Has_Discriminants (Typ));
end Object_Type_Has_Constrained_Partial_View;
------------------
-- Package_Body --
------------------
function Package_Body (E : Entity_Id) return Node_Id is
Body_Decl : Node_Id;
Body_Id : constant Opt_E_Package_Body_Id :=
Corresponding_Body (Package_Spec (E));
begin
if Present (Body_Id) then
Body_Decl := Parent (Body_Id);
if Nkind (Body_Decl) = N_Defining_Program_Unit_Name then
Body_Decl := Parent (Body_Decl);
end if;
pragma Assert (Nkind (Body_Decl) = N_Package_Body);
return Body_Decl;
else
return Empty;
end if;
end Package_Body;
------------------
-- Package_Spec --
------------------
function Package_Spec (E : Entity_Id) return Node_Id is
begin
return Parent (Package_Specification (E));
end Package_Spec;
---------------------------
-- Package_Specification --
---------------------------
function Package_Specification (E : Entity_Id) return Node_Id is
N : Node_Id;
begin
pragma Assert (Is_Package_Or_Generic_Package (E));
N := Parent (E);
if Nkind (N) = N_Defining_Program_Unit_Name then
N := Parent (N);
end if;
pragma Assert (Nkind (N) = N_Package_Specification);
return N;
end Package_Specification;
---------------------
-- Subprogram_Body --
---------------------
function Subprogram_Body (E : Entity_Id) return Node_Id is
Body_E : constant Entity_Id := Subprogram_Body_Entity (E);
begin
if No (Body_E) then
return Empty;
else
return Parent (Subprogram_Specification (Body_E));
end if;
end Subprogram_Body;
----------------------------
-- Subprogram_Body_Entity --
----------------------------
function Subprogram_Body_Entity (E : Entity_Id) return Entity_Id is
N : constant Node_Id := Parent (Subprogram_Specification (E));
-- Declaration for E
begin
-- If this declaration is not a subprogram body, then it must be a
-- subprogram declaration or body stub, from which we can retrieve the
-- entity for the corresponding subprogram body if any, or an abstract
-- subprogram declaration, for which we return Empty.
case Nkind (N) is
when N_Subprogram_Body =>
return E;
when N_Subprogram_Body_Stub
| N_Subprogram_Declaration
=>
return Corresponding_Body (N);
when others =>
return Empty;
end case;
end Subprogram_Body_Entity;
---------------------
-- Subprogram_Spec --
---------------------
function Subprogram_Spec (E : Entity_Id) return Node_Id is
N : constant Node_Id := Parent (Subprogram_Specification (E));
-- Declaration for E
begin
-- This declaration is either subprogram declaration or a subprogram
-- body, in which case return Empty.
if Nkind (N) = N_Subprogram_Declaration then
return N;
else
return Empty;
end if;
end Subprogram_Spec;
------------------------------
-- Subprogram_Specification --
------------------------------
function Subprogram_Specification (E : Entity_Id) return Node_Id is
N : Node_Id;
begin
N := Parent (E);
if Nkind (N) = N_Defining_Program_Unit_Name then
N := Parent (N);
end if;
-- If the Parent pointer of E is not a subprogram specification node
-- (going through an intermediate N_Defining_Program_Unit_Name node
-- for subprogram units), then E is an inherited operation. Its parent
-- points to the type derivation that produces the inheritance: that's
-- the node that generates the subprogram specification. Its alias
-- is the parent subprogram, and that one points to a subprogram
-- declaration, or to another type declaration if this is a hierarchy
-- of derivations.
if Nkind (N) not in N_Subprogram_Specification then
pragma Assert (Present (Alias (E)));
N := Subprogram_Specification (Alias (E));
end if;
return N;
end Subprogram_Specification;
--------------------
-- Ultimate_Alias --
--------------------
function Ultimate_Alias (Prim : Entity_Id) return Entity_Id is
E : Entity_Id := Prim;
begin
while Present (Alias (E)) loop
pragma Assert (Alias (E) /= E);
E := Alias (E);
end loop;
return E;
end Ultimate_Alias;
--------------------------
-- Unit_Declaration_Node --
--------------------------
function Unit_Declaration_Node (Unit_Id : Entity_Id) return Node_Id is
N : Node_Id := Parent (Unit_Id);
begin
-- Predefined operators do not have a full function declaration
if Ekind (Unit_Id) = E_Operator then
return N;
end if;
-- Isn't there some better way to express the following ???
while Nkind (N) /= N_Abstract_Subprogram_Declaration
and then Nkind (N) /= N_Entry_Body
and then Nkind (N) /= N_Entry_Declaration
and then Nkind (N) /= N_Formal_Package_Declaration
and then Nkind (N) /= N_Function_Instantiation
and then Nkind (N) /= N_Generic_Package_Declaration
and then Nkind (N) /= N_Generic_Subprogram_Declaration
and then Nkind (N) /= N_Package_Declaration
and then Nkind (N) /= N_Package_Body
and then Nkind (N) /= N_Package_Instantiation
and then Nkind (N) /= N_Package_Renaming_Declaration
and then Nkind (N) /= N_Procedure_Instantiation
and then Nkind (N) /= N_Protected_Body
and then Nkind (N) /= N_Protected_Type_Declaration
and then Nkind (N) /= N_Subprogram_Declaration
and then Nkind (N) /= N_Subprogram_Body
and then Nkind (N) /= N_Subprogram_Body_Stub
and then Nkind (N) /= N_Subprogram_Renaming_Declaration
and then Nkind (N) /= N_Task_Body
and then Nkind (N) /= N_Task_Type_Declaration
and then Nkind (N) not in N_Formal_Subprogram_Declaration
and then Nkind (N) not in N_Generic_Renaming_Declaration
loop
N := Parent (N);
-- We don't use Assert here, because that causes an infinite loop
-- when assertions are turned off. Better to crash.
if No (N) then
raise Program_Error;
end if;
end loop;
return N;
end Unit_Declaration_Node;
end Sem_Aux;
|
reznikmm/matreshka | Ada | 5,091 | ads | ------------------------------------------------------------------------------
-- --
-- Matreshka Project --
-- --
-- Ada Modeling Framework --
-- --
-- Runtime Library Component --
-- --
------------------------------------------------------------------------------
-- --
-- Copyright © 2011-2012, Vadim Godunko <[email protected]> --
-- All rights reserved. --
-- --
-- Redistribution and use in source and binary forms, with or without --
-- modification, are permitted provided that the following conditions --
-- are met: --
-- --
-- * Redistributions of source code must retain the above copyright --
-- notice, this list of conditions and the following disclaimer. --
-- --
-- * Redistributions in binary form must reproduce the above copyright --
-- notice, this list of conditions and the following disclaimer in the --
-- documentation and/or other materials provided with the distribution. --
-- --
-- * Neither the name of the Vadim Godunko, IE nor the names of its --
-- contributors may be used to endorse or promote products derived from --
-- this software without specific prior written permission. --
-- --
-- THIS SOFTWARE IS PROVIDED BY THE COPYRIGHT HOLDERS AND CONTRIBUTORS --
-- "AS IS" AND ANY EXPRESS OR IMPLIED WARRANTIES, INCLUDING, BUT NOT --
-- LIMITED TO, THE IMPLIED WARRANTIES OF MERCHANTABILITY AND FITNESS FOR --
-- A PARTICULAR PURPOSE ARE DISCLAIMED. IN NO EVENT SHALL THE COPYRIGHT --
-- HOLDER OR CONTRIBUTORS BE LIABLE FOR ANY DIRECT, INDIRECT, INCIDENTAL, --
-- SPECIAL, EXEMPLARY, OR CONSEQUENTIAL DAMAGES (INCLUDING, BUT NOT LIMITED --
-- TO, PROCUREMENT OF SUBSTITUTE GOODS OR SERVICES; LOSS OF USE, DATA, OR --
-- PROFITS; OR BUSINESS INTERRUPTION) HOWEVER CAUSED AND ON ANY THEORY OF --
-- LIABILITY, WHETHER IN CONTRACT, STRICT LIABILITY, OR TORT (INCLUDING --
-- NEGLIGENCE OR OTHERWISE) ARISING IN ANY WAY OUT OF THE USE OF THIS --
-- SOFTWARE, EVEN IF ADVISED OF THE POSSIBILITY OF SUCH DAMAGE. --
-- --
------------------------------------------------------------------------------
-- $Revision$ $Date$
------------------------------------------------------------------------------
-- This file is generated, don't edit it.
------------------------------------------------------------------------------
-- A data type is a type whose instances are identified only by their value.
-- A data type may contain attributes to support the modeling of structured
-- data types.
------------------------------------------------------------------------------
with AMF.UML.Classifiers;
limited with AMF.UML.Named_Elements.Collections;
limited with AMF.UML.Operations.Collections;
limited with AMF.UML.Properties.Collections;
package AMF.UML.Data_Types is
pragma Preelaborate;
type UML_Data_Type is limited interface
and AMF.UML.Classifiers.UML_Classifier;
type UML_Data_Type_Access is
access all UML_Data_Type'Class;
for UML_Data_Type_Access'Storage_Size use 0;
not overriding function Get_Owned_Attribute
(Self : not null access constant UML_Data_Type)
return AMF.UML.Properties.Collections.Ordered_Set_Of_UML_Property is abstract;
-- Getter of DataType::ownedAttribute.
--
-- The Attributes owned by the DataType.
not overriding function Get_Owned_Operation
(Self : not null access constant UML_Data_Type)
return AMF.UML.Operations.Collections.Ordered_Set_Of_UML_Operation is abstract;
-- Getter of DataType::ownedOperation.
--
-- The Operations owned by the DataType.
overriding function Inherit
(Self : not null access constant UML_Data_Type;
Inhs : AMF.UML.Named_Elements.Collections.Set_Of_UML_Named_Element)
return AMF.UML.Named_Elements.Collections.Set_Of_UML_Named_Element is abstract;
-- Operation DataType::inherit.
--
-- The inherit operation is overridden to exclude redefined properties.
end AMF.UML.Data_Types;
|
AdaCore/gpr | Ada | 27,438 | ads | --
-- Copyright (C) 2014-2022, AdaCore
-- SPDX-License-Identifier: Apache-2.0
--
-- This package provides a generic API so that programs can work with the
-- $.Introspection packages of all Langkit-generated libraries.
--
-- Note that it is experimental at this stage, and thus not officially
-- supported.
private with Ada.Containers.Hashed_Maps;
private with Ada.Finalization;
private with Ada.Unchecked_Deallocation;
with GNATCOLL.GMP.Integers; use GNATCOLL.GMP.Integers;
with Gpr_Parser_Support.Generic_API.Analysis;
use Gpr_Parser_Support.Generic_API.Analysis;
limited private with Gpr_Parser_Support.Internal.Introspection;
with Gpr_Parser_Support.Slocs; use Gpr_Parser_Support.Slocs;
with Gpr_Parser_Support.Symbols; use Gpr_Parser_Support.Symbols;
package Gpr_Parser_Support.Generic_API.Introspection is
------------------------
-- Polymorphic values --
------------------------
type Type_Ref is private;
-- Reference to the type of a polymorphic value: boolean, integer,
-- character, ...
No_Type_Ref : constant Type_Ref;
-- Special value to express no type reference
type Type_Ref_Array is array (Positive range <>) of Type_Ref;
function Language (T : Type_Ref) return Language_Id;
-- Return the language ID corresponding to the given type. Raise a
-- ``Precondition_Failure`` exception if ``T`` is ``No_Type_Ref``.
function Debug_Name (T : Type_Ref) return String;
-- Return the free-form name of this type for debug purposes, or
-- "<No_Type_Ref>" if ``T`` is ``No_Type_Ref``.
function All_Types (Id : Language_Id) return Type_Ref_Array;
-- Return the list of all types that the given language defines
type Any_Type_Index is new Natural;
-- Language-specific index to designate a type.
--
-- A given language defines types for the ``1 .. Last_Type (Language)``
-- range: see the ``Last_Type`` function below.
No_Type_Index : constant Any_Type_Index := 0;
-- Special ``Any_Type_Index`` to mean: no reference to a type
subtype Type_Index is Any_Type_Index range 1 .. Any_Type_Index'Last;
function To_Index (T : Type_Ref) return Type_Index;
-- Return the index of the given type. Raise a ``Precondition_Failure``
-- exception if ``T`` is ``No_Type_Ref``.
function From_Index (Id : Language_Id; T : Type_Index) return Type_Ref;
-- Return the type for the given language corresponding to the ``T`` index.
-- Raise a ``Precondition_Failure`` exception if ``T`` is not a valid type
-- index for the given language.
function Last_Type (Id : Language_Id) return Type_Index;
-- Return the last type index that is valid for the given language
type Type_Category is
(Analysis_Unit_Category,
Big_Int_Category,
Bool_Category,
Char_Category,
Int_Category,
Source_Location_Range_Category,
String_Category,
Token_Category,
Symbol_Category,
Enum_Category,
Array_Category,
Iterator_Category,
Struct_Category);
-- Each type has a category, which determines the kind of operation that
-- can be performed on that type: for instance one can get the length of
-- ``Array_Category``-typed values.
function Category (T : Type_Ref) return Type_Category;
-- Return the category of the given type
type Value_Ref is private;
-- Reference to a polymorphic value: boolean, integer, character, ...
No_Value_Ref : constant Value_Ref;
-- Special constant to express no value reference
type Value_Ref_Array is array (Positive range <>) of Value_Ref;
function "=" (Left, Right : Value_Ref) return Boolean;
-- Return whether ``Left`` and ``Right`` are structurally equivalent
function Language (Value : Value_Ref) return Language_Id;
-- Return the language ID corresponding to the given value. Raise a
-- ``Precondition_Failure`` exception if ``Value`` is ``No_Value_Ref``.
function Type_Of (Value : Value_Ref) return Type_Ref;
-- Return the type of the ``Value`` polymorphic value. Raise a
-- ``Precondition_Error`` if ``Value`` is ``No_Value_Ref``.
function Type_Matches (Value : Value_Ref; T : Type_Ref) return Boolean;
-- Return whether ``Value`` is a valid value to be passed as a ``T``
-- argument.
--
-- Raise a ``Precondition_Error`` if:
--
-- * ``Value`` is ``No_Value_Ref``;
-- * ``T`` is ``No_Type_Ref``;
-- * ``Value`` and ``T`` do not belong to the same language.
function Image (Value : Value_Ref) return String;
-- Return a string that represents ``Value``, for logging/debugging
-- purposes. Note that the goal here is to return a short human-readable
-- string, not a string that contains all the information in ``Value``.
--
-- Unlike other ``Value_Ref`` primitives, it is valid to call ``Image`` on
-- ``No_Value_Ref``.
-- Constructors/getters for built in types
function From_Unit (Id : Language_Id; Value : Lk_Unit) return Value_Ref;
function As_Unit (Value : Value_Ref) return Lk_Unit;
function From_Big_Int
(Id : Language_Id; Value : Big_Integer) return Value_Ref;
function As_Big_Int (Value : Value_Ref) return Big_Integer;
function From_Bool (Id : Language_Id; Value : Boolean) return Value_Ref;
function As_Bool (Value : Value_Ref) return Boolean;
function From_Char
(Id : Language_Id; Value : Character_Type) return Value_Ref;
function As_Char (Value : Value_Ref) return Character_Type;
function From_Int (Id : Language_Id; Value : Integer) return Value_Ref;
function As_Int (Value : Value_Ref) return Integer;
function From_Source_Location_Range
(Id : Language_Id; Value : Source_Location_Range) return Value_Ref;
function As_Source_Location_Range
(Value : Value_Ref) return Source_Location_Range;
function From_String
(Id : Language_Id; Value : Text_Type) return Value_Ref;
function As_String (Value : Value_Ref) return Text_Type;
function From_Token (Id : Language_Id; Value : Lk_Token) return Value_Ref;
function As_Token (Value : Value_Ref) return Lk_Token;
function From_Symbol
(Id : Language_Id; Value : Text_Type) return Value_Ref;
function As_Symbol (Value : Value_Ref) return Text_Type;
function From_Node (Id : Language_Id; Value : Lk_Node) return Value_Ref;
function As_Node (Value : Value_Ref) return Lk_Node;
function Type_Of (Node : Lk_Node) return Type_Ref;
-- Return the type of ``Node``. Raise a ``Precondition_Failure`` if
-- ``Node`` is ``No_Lk_Node``.
function Type_Matches (Node : Lk_Node; T : Type_Ref) return Boolean;
-- Overload of the ``Type_Matches`` function taking a ``Value_Ref``
-- argument, for convenience.
----------------
-- Enum types --
----------------
function Is_Enum_Type (T : Type_Ref) return Boolean;
-- Return whether ``T`` references an enum type.
--
-- All functions below will raise a ``Precondition_Failure`` if passed a
-- type which does not satisfy this predicate as ``Enum`` formals.
function Enum_Type_Name (Enum : Type_Ref) return Name_Type;
-- Return the name of the given enum type
function All_Enum_Types (Id : Language_Id) return Type_Ref_Array;
-- Return the list of all enum types that the given language defines
type Enum_Value_Ref is private;
-- Reference to an enum type value
No_Enum_Value_Ref : constant Enum_Value_Ref;
-- Special value to express no enum value reference
type Enum_Value_Ref_Array is array (Positive range <>) of Enum_Value_Ref;
function Enum_For (Value : Enum_Value_Ref) return Type_Ref;
-- Return the enum type that owns the given value
function Enum_Default_Value (Enum : Type_Ref) return Enum_Value_Ref;
-- Return the index of the default enum value for the given ``Enum`` enum
-- type, or ``No_Enum_Value_Ref`` if this type does not have a default
-- value.
function Enum_Value_Name (Value : Enum_Value_Ref) return Name_Type;
-- Return the name corresponding to the ``Index``th value for the ``Enum``
-- enum type. This raises a ``Out_Of_Bounds_Error`` if ``Index`` is too big
-- for this enum type.
function Debug_Name (Value : Enum_Value_Ref) return String;
-- Return "X.Y" where X is the enum type and Y is the name of this value,
-- or "<No_Enum_Value_Ref>" if ``Value`` is null.
function All_Enum_Values (Enum : Type_Ref) return Enum_Value_Ref_Array;
-- Return the list of all enum values for the given enum type
type Any_Enum_Value_Index is new Natural;
subtype Enum_Value_Index is Any_Enum_Value_Index
range 1 .. Any_Enum_Value_Index'Last;
-- Index of an enum value for a given enum type
No_Enum_Value_Index : constant Any_Enum_Value_Index := 0;
-- Special ``Any_Enum_Value_Index`` to mean: no reference to a type
function To_Index (Value : Enum_Value_Ref) return Enum_Value_Index;
-- Return the index of the given type. Raise a ``Precondition_Failure``
-- exception if ``Value`` is ``No_Enum_Value_Ref``.
function From_Index
(Enum : Type_Ref; Value : Enum_Value_Index) return Enum_Value_Ref;
-- Return the value for the given enum type corresponding to the ``Value``
-- index. Raise a ``Precondition_Failure`` exception if ``Value`` is not a
-- valid value index for that enum type.
function Enum_Last_Value (Enum : Type_Ref) return Enum_Value_Index;
-- Return the index of the last enum value for the given ``Enum`` enum type
function Create_Enum (Value : Enum_Value_Ref) return Value_Ref;
-- Convert an ``Enum_Value_Ref`` into the corresponding ``Value_Ref``
function As_Enum (Value : Value_Ref) return Enum_Value_Ref;
-- Assuming ``Value`` is an enum value, return the corresponding
-- ``Enum_Value_Ref``. Raise a ``Precondition_Failure`` exception if
-- ``Value`` is not an enum value.
-----------------
-- Array types --
-----------------
function Is_Array_Type (T : Type_Ref) return Boolean;
-- Return whether ``T`` references an array type.
--
-- All functions below will raise a ``Precondition_Failure`` if passed a
-- type which does not satisfy this predicate as ``T`` formals.
function Array_Element_Type (T : Type_Ref) return Type_Ref;
-- Return the type of elements in ``T`` arrays
function All_Array_Types (Id : Language_Id) return Type_Ref_Array;
-- Return the list of all array types that the given language defines
function Create_Array
(T : Type_Ref; Values : Value_Ref_Array) return Value_Ref;
-- Create an array of the given ``T`` type, with the given ``Values``.
-- Raise a ``Precondition_Failure`` if any of the following is true:
--
-- * ``T`` is null;
-- * ``Values`` contains a null value reference;
-- * ``Values`` contains a value that does not match ``T``'s element type;
-- * one ``Values`` item does not belong to the same language as ``T``.
function As_Array (Value : Value_Ref) return Value_Ref_Array;
-- Return values for all items in the ``Value`` array. Raise a
-- ``Precondition_Failure`` if ``Value`` is null or if it does not
-- reference an array.
function Array_Length (Value : Value_Ref) return Natural;
-- Return the length of the given ``Value`` array. Raise a
-- ``Precondition_Failure`` if ``Value`` is null or if it does not
-- reference an array.
function Array_Item (Value : Value_Ref; Index : Positive) return Value_Ref;
-- Return the item at the given ``Index`` in the ``Value`` array. Raise a
-- ``Precondition_Failure`` if any of the following is true:
--
-- * ``Value`` is null;
-- * it does not reference an array;
-- * ``Index`` is out of bounds for this array value.
--------------------
-- Iterator types --
--------------------
function Is_Iterator_Type (T : Type_Ref) return Boolean;
-- Return whether ``T`` references an iterator type.
--
-- All functions below will raise a ``Precondition_Failure`` if passed a
-- type which does not satisfy this predicate as ``T`` formals.
function Iterator_Element_Type (T : Type_Ref) return Type_Ref;
-- Return the type of elements in ``T`` iterators
function All_Iterator_Types (Id : Language_Id) return Type_Ref_Array;
-- Return the list of all iterator types that the given language defines
function Iterator_Next (Value : Value_Ref) return Value_Ref;
-- Return the next item in the ``Value`` iterator, or ``No_Value_Ref`` if
-- there is no item left in the iterator. Raise a ``Precondition_Failure``
-- if ``Value`` is null or not a reference to an iterator.
-----------------------
-- Struct/node types --
-----------------------
function Is_Base_Struct_Type (T : Type_Ref) return Boolean;
-- Return whether ``T`` references a struct or node type.
--
-- All functions below will raise a ``Precondition_Failure`` if passed a
-- type which does not satisfy this predicate as ``T`` formals.
function Base_Struct_Type_Name (T : Type_Ref) return Name_Type;
-- Return the name for the given struct/node type
function All_Base_Struct_Types (Id : Language_Id) return Type_Ref_Array;
-- Return the list of all base struct types that the given language defines
------------------
-- Struct types --
------------------
function Is_Struct_Type (T : Type_Ref) return Boolean;
-- Return whether ``T`` references a struct type.
--
-- All functions below will raise a ``Precondition_Failure`` if passed a
-- type which does not satisfy this predicate as ``Struct`` formals.
function Struct_Type_Name (Struct : Type_Ref) return Name_Type;
-- Return the name for the given struct type
function All_Struct_Types (Id : Language_Id) return Type_Ref_Array;
-- Return the list of all struct types that the given language defines
function Create_Struct
(T : Type_Ref; Values : Value_Ref_Array) return Value_Ref;
-- Create a struct of the given ``T`` type, with the given ``Values``.
-- Raise a ``Precondition_Failure`` if any of the following is true:
--
-- * ``T`` is null;
-- * ``Values`` contains a null value reference;
-- * ``Values`` does not match ``T``'s fields, both in number or in types;
-- * one ``Values`` item does not belong to the same language as ``T``.
----------------
-- Node types --
----------------
function Is_Node_Type (T : Type_Ref) return Boolean;
-- Return whether ``T`` references a node type.
--
-- All functions below will raise a ``Precondition_Failure`` if passed
-- a type which does not satisfy this predicate as ``Node``/``Parent``
-- formals.
function Root_Node_Type (Id : Language_Id) return Type_Ref;
-- Return the type for the root node in the given language
function Node_Type_Name (Node : Type_Ref) return Name_Type;
-- Return the name for the given node type
function Node_Type_Repr_Name (Node : Type_Ref) return Text_Type;
-- Return the "representation" name (i.e. name used in text dumps) for the
-- given node type.
function Is_Abstract (Node : Type_Ref) return Boolean;
-- Return whether ``Node`` designates an abstract node
function Is_Token_Node (Node : Type_Ref) return Boolean;
-- Return whether ``Node`` designates a token node
function Is_List_Node (Node : Type_Ref) return Boolean;
-- Return whether ``Node`` designates a list node
function Is_Concrete (Node : Type_Ref) return Boolean
is (not Is_Abstract (Node));
function Base_Type (Node : Type_Ref) return Type_Ref;
-- If ``Node`` is the root node type, raise a ``Bad_Type_Error`` exception.
-- Otherwise, return ``Node``'s base type.
function Derived_Types (Node : Type_Ref) return Type_Ref_Array;
-- Return type references for all direct derivations for ``Node``
function Last_Derived_Type (Node : Type_Ref) return Type_Index;
-- Return the index of the ``Result`` type so that the ``Node .. Result``
-- range contains exactly all node types that derive (directly or
-- indirectly) from ``Node``.
function Is_Derived_From (Node, Parent : Type_Ref) return Boolean;
-- Return whether the ``Node`` node type derives (directly or indirectly)
-- from ``Parent``.
function All_Node_Types (Id : Language_Id) return Type_Ref_Array;
-- Return the list of all node types that the given language defines
function Grammar_Rule_Type (Rule : Grammar_Rule_Ref) return Type_Ref;
-- Return the type for nodes that the given parsing ``Rule`` can create
-------------------------
-- Struct/node members --
-------------------------
type Struct_Member_Ref is private;
-- Reference to a struct member (field or property)
No_Struct_Member_Ref : constant Struct_Member_Ref;
-- Special value to express no struct member reference
type Struct_Member_Ref_Array is
array (Positive range <>) of Struct_Member_Ref;
function Debug_Name (Member : Struct_Member_Ref) return String;
-- Return "X.Y" where X is the type that owns this member and Y is the name
-- of this member, or "<No_Struct_Member_Ref>" if ``Member`` is null.
function Owner (Member : Struct_Member_Ref) return Type_Ref;
-- Return the type that owns this member. Raise a ``Precondition_Failure``
-- exception if ``Member`` is ``No_Struct_Member_Ref``.
function Is_Property (Member : Struct_Member_Ref) return Boolean;
-- Whether ``Member`` is a property
function Is_Field (Member : Struct_Member_Ref) return Boolean
is (not Is_Property (Member));
-- Whether ``Member`` is a field (simple field for structs, syntax field
-- for nodes).
function Is_Null_For
(Member : Struct_Member_Ref; Node : Type_Ref) return Boolean;
-- Return whether ``Member`` is a syntax field that is always null for
-- ``Node``.
function Syntax_Field_Index
(Member : Struct_Member_Ref; Node : Type_Ref) return Positive;
-- Return the 1-based index corresponding to the given ``Member`` in the
-- given ``Node`` type.
--
-- Raise a ``Precondition_Failure`` exception if:
--
-- * ``Node`` is not a valid node type;
-- * ``Node`` is not a concrete node type;
-- * ``Member`` is not a syntax field for ``Node``;
-- * ``Member`` is a null syntax field for ``Node``.
function All_Members (Id : Language_Id) return Struct_Member_Ref_Array;
-- Return all struct members that the given language defines
function Members (Struct : Type_Ref) return Struct_Member_Ref_Array;
-- Return the list of members that ``Struct`` has
function Member_Name (Member : Struct_Member_Ref) return Name_Type;
-- Return the name of ``Member``
function Member_Type (Member : Struct_Member_Ref) return Type_Ref;
-- Return the type of ``Member``
type Any_Struct_Member_Index is new Natural;
subtype Struct_Member_Index is
Any_Struct_Member_Index range 1 .. Any_Struct_Member_Index'Last;
-- Language-specific index to designate a struct member.
--
-- A given language defines members for the ``1 .. Last_Struct_Member
-- (Language)`` range: see the ``Last_Struct_Member`` function below.
No_Struct_Member : constant Any_Struct_Member_Index := 0;
-- Special ``Any_Struct_Member_Index`` to mean: no reference to an argument
function To_Index (Member : Struct_Member_Ref) return Struct_Member_Index;
-- Return the index of the given struct member. Raise a
-- ``Precondition_Failure`` exception if ``Member`` is
-- ``No_Struct_Member``.
function From_Index
(Id : Language_Id; Member : Struct_Member_Index) return Struct_Member_Ref;
-- Return the struct member for the given language corresponding to the
-- ``Member`` index. Raise a ``Precondition_Failure`` exception if
-- ``Member`` is not a valid member index for the given language.
function Last_Struct_Member (Id : Language_Id) return Struct_Member_Index;
-- Return the last struct member index that is valid for the given language
subtype Any_Argument_Index is Natural;
subtype Argument_Index is
Any_Argument_Index range 1 .. Any_Argument_Index'Last;
-- Index of a property argument
No_Argument_Index : constant Any_Argument_Index := 0;
function Member_Argument_Type
(Member : Struct_Member_Ref; Argument : Argument_Index) return Type_Ref;
-- Return the type of the given property argument
function Member_Argument_Name
(Member : Struct_Member_Ref; Argument : Argument_Index) return Name_Type;
-- Return the name of the given property argument
function Member_Argument_Default_Value
(Member : Struct_Member_Ref; Argument : Argument_Index) return Value_Ref;
-- Return the default value for the given property argument, or
-- ``No_Value_Ref`` if it has no default value.
function Member_Last_Argument
(Member : Struct_Member_Ref) return Any_Argument_Index;
-- Return the index of ``Member``'s last argument according to the given
-- language. If it has no argument, return ``No_Argument_Index``.
function Eval_Member
(Value : Value_Ref;
Member : Struct_Member_Ref;
Arguments : Value_Ref_Array := (1 .. 0 => No_Value_Ref))
return Value_Ref;
-- Evaluate the given ``Member`` of ``Value`` with the given ``Arguments``
-- and return the result value. Raise a ``Precondition_Failure`` if any of
-- the following is true:
--
-- * ``Value`` is null, or not a struct;
-- * ``Member`` is null, does not belong to the same language as ``Value``,
-- or not a valid member for ``Value``;
-- * ``Arguments`` does not match the arguments that ``Member`` expects.
function Eval_Node_Member
(Value : Lk_Node;
Member : Struct_Member_Ref;
Arguments : Value_Ref_Array := (1 .. 0 => No_Value_Ref))
return Value_Ref;
-- Shortcut for ``Eval_Member``, working directly on a node
---------------
-- Name maps --
---------------
type Name_Map is tagged private;
-- Map from names to enum types, enum values, struct types and struct
-- members for a given casing convention and a given language.
function Create_Name_Map
(Id : Language_Id;
Symbols : Symbol_Table;
Enum_Types : Casing_Convention;
Enum_Values : Casing_Convention;
Struct_Types : Casing_Convention;
Struct_Members : Casing_Convention) return Name_Map;
-- Return a map from names to types, values and members for the given
-- language. Names are encoded according to the given casing convention for
-- each kind of entity, and internalized using the ``Symbols`` symbol
-- table.
function Lookup_Type (Self : Name_Map; Name : Symbol_Type) return Type_Ref;
-- Look for an enum/struct type indexed in ``Self`` called ``Name``. Return
-- it if there is one, or ``No_Type_Ref`` is no type matches that name.
-- The casing convention used for ``Name`` must match with the one used to
-- create ``Self``.
function Lookup_Enum_Value
(Self : Name_Map;
Enum : Type_Ref;
Name : Symbol_Type) return Enum_Value_Ref;
-- Look in ``Self`` for the enum value called ``Name`` for the given
-- ``Enum`` type. Return it if there is one, or ``No_Enum_Value_Ref`` is no
-- value matches that name. The casing convention used for ``Name`` must
-- match with the one used to create ``Self``.
function Lookup_Struct_Member
(Self : Name_Map;
Struct : Type_Ref;
Name : Symbol_Type) return Struct_Member_Ref;
-- Look for the ``Struct`` member called ``Name``. Return it if there is
-- one, or ``No_Struct_Member_Ref`` if this struct type has no such member.
-- The casing convention used for ``Name`` must match with the one used to
-- create ``Self``.
private
type Type_Ref is record
Id : Any_Language_Id;
Index : Any_Type_Index;
-- Either this is ``No_Type_Ref``, and in that case both members should
-- be null/zero, either ``Index`` designates a valid type for the
-- language ``Id`` represents.
end record;
type Internal_Value_Access is
access all Gpr_Parser_Support.Internal.Introspection.Internal_Value'Class;
type Value_Ref is new Ada.Finalization.Controlled with record
Value : Internal_Value_Access;
end record;
overriding procedure Adjust (Self : in out Value_Ref);
overriding procedure Finalize (Self : in out Value_Ref);
type Enum_Value_Ref is record
Enum : Type_Ref;
Index : Any_Enum_Value_Index;
-- Either this is ``No_Enum_Value_Ref``, and in that case both members
-- should be null/zero, either ``Index`` designates a valid value for
-- the enum type ``Enum`` represents.
end record;
type Struct_Member_Ref is record
Id : Any_Language_Id;
Index : Any_Struct_Member_Index;
-- Either this is ``No_Struct_Member_Ref``, and in that case both
-- members should be null/zero, either ``Index`` designates a valid
-- member for the language ``Id`` represents.
end record;
No_Type_Ref : constant Type_Ref := (null, 0);
No_Value_Ref : constant Value_Ref :=
(Ada.Finalization.Controlled with Value => null);
No_Enum_Value_Ref : constant Enum_Value_Ref := (No_Type_Ref, 0);
No_Struct_Member_Ref : constant Struct_Member_Ref := (null, 0);
package Named_Type_Maps is new Ada.Containers.Hashed_Maps
(Key_Type => Symbol_Type,
Element_Type => Type_Ref,
Hash => Hash,
Equivalent_Keys => "=");
package Enum_Value_Maps is new Ada.Containers.Hashed_Maps
(Key_Type => Symbol_Type,
Element_Type => Enum_Value_Ref,
Hash => Hash,
Equivalent_Keys => "=");
type Enum_Value_Map_Array is
array (Type_Index range <>) of Enum_Value_Maps.Map;
type Enum_Value_Maps_Access is access Enum_Value_Map_Array;
procedure Free is new Ada.Unchecked_Deallocation
(Enum_Value_Map_Array, Enum_Value_Maps_Access);
type Struct_Member_Name_Array is
array (Struct_Member_Index range <>) of Symbol_Type;
type Struct_Member_Names_Access is access Struct_Member_Name_Array;
procedure Free is new Ada.Unchecked_Deallocation
(Struct_Member_Name_Array, Struct_Member_Names_Access);
type Name_Map is new Ada.Finalization.Controlled with record
Id : Language_Id;
-- Language for which this map was created.
--
-- Since this member is automatically initialized to null and creating a
-- name map always assigns it a non-null value, we can compare this
-- member to null to check if the name map has been created.
Type_Map : Named_Type_Maps.Map;
-- Map enum/struct type names to type references
Enum_Value_Maps : Enum_Value_Maps_Access;
-- For each enum type, map from enum value names to enum value
-- references.
Struct_Member_Names : Struct_Member_Names_Access;
-- Names for all struct members
end record;
overriding procedure Adjust (Self : in out Name_Map);
overriding procedure Finalize (Self : in out Name_Map);
procedure Check_Name_Map (Self : Name_Map);
-- Raise a ``Precondition_Failure`` exception if ``Self`` is not
-- initialized.
end Gpr_Parser_Support.Generic_API.Introspection;
|
onox/orka | Ada | 2,478 | adb | -- 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 GL.Types;
with Orka.Contexts.AWT;
with Orka.Rendering.Buffers;
with Orka.Rendering.Drawing;
with Orka.Rendering.Framebuffers;
with Orka.Rendering.Programs.Modules;
with Orka.Resources.Locations.Directories;
with Orka.Windows;
with AWT;
procedure Orka_1_Triangle is
Context : constant Orka.Contexts.Context'Class := Orka.Contexts.AWT.Create_Context
(Version => (4, 2), Flags => (Debug => True, others => False));
Window : Orka.Windows.Window'Class
:= Orka.Contexts.AWT.Create_Window (Context, Width => 500, Height => 500, Resizable => False);
use Orka.Resources;
use Orka.Rendering.Buffers;
use Orka.Rendering.Framebuffers;
use Orka.Rendering.Programs;
use type Orka.Float_32;
Location_Shaders : constant Locations.Location_Ptr
:= Locations.Directories.Create_Location ("data/shaders");
Program_1 : Program := Create_Program (Modules.Create_Module
(Location_Shaders, VS => "opengl3.vert", FS => "opengl3.frag"));
FB_D : Framebuffer := Create_Default_Framebuffer (Window.Width, Window.Height);
Vertices : constant Orka.Float_32_Array
:= (-0.5, -0.5, 0.0, 1.0, 1.0, 0.0, 0.0, 0.0,
0.5, -0.5, 0.0, 1.0, 0.0, 1.0, 0.0, 0.0,
0.0, 0.5, 0.0, 1.0, 0.0, 0.0, 1.0, 0.0);
-- Upload Vertices data to buffer
Buffer_1 : constant Buffer := Create_Buffer ((others => False), Vertices);
begin
FB_D.Set_Default_Values ((Color => (0.0, 0.0, 0.0, 1.0), others => <>));
FB_D.Use_Framebuffer;
Program_1.Use_Program;
Buffer_1.Bind (Shader_Storage, 0);
while not Window.Should_Close loop
AWT.Process_Events (0.001);
FB_D.Clear ((Color => True, others => False));
Orka.Rendering.Drawing.Draw (GL.Types.Triangles, 0, 3);
Window.Swap_Buffers;
end loop;
end Orka_1_Triangle;
|
MinimSecure/unum-sdk | Ada | 949 | adb | -- Copyright 2008-2016 Free Software Foundation, Inc.
--
-- This program is free software; you can redistribute it and/or modify
-- it under the terms of the GNU General Public License as published by
-- the Free Software Foundation; either version 3 of the License, or
-- (at your option) any later version.
--
-- This program is distributed in the hope that it will be useful,
-- but WITHOUT ANY WARRANTY; without even the implied warranty of
-- MERCHANTABILITY or FITNESS FOR A PARTICULAR PURPOSE. See the
-- GNU General Public License for more details.
--
-- You should have received a copy of the GNU General Public License
-- along with this program. If not, see <http://www.gnu.org/licenses/>.
package body Pck is
type Empty is record
Month : Integer;
Year : Integer;
end record;
function Create return Wrap is
begin
return (E => new Empty'(Month => 8, Year => 1974));
end Create;
end Pck;
|
tobiasphilipp/sid-checker | Ada | 1,106 | ads | ------------------------------------------------------------------------------
-- --
-- A verified resolution checker written in SPARK 2014 based on functional --
-- data structures. --
-- --
------------------------------------------------------------------------------
-- --
-- Copyright (C) 2021, Tobias Philipp --
-- --
------------------------------------------------------------------------------
with AUnit; use AUnit;
with AUnit.Test_Cases; use AUnit.Test_Cases;
package Sid_Tests
is
pragma Elaborate_Body;
type Sid_Test is new Test_Cases.Test_Case with null record;
procedure Register_Tests
( T: in out Sid_Test);
function Name
(T : Sid_Test) return Message_String;
end Sid_Tests;
|
reznikmm/matreshka | Ada | 5,262 | ads | ------------------------------------------------------------------------------
-- --
-- Matreshka Project --
-- --
-- Ada Modeling Framework --
-- --
-- Runtime Library Component --
-- --
------------------------------------------------------------------------------
-- --
-- Copyright © 2012, Vadim Godunko <[email protected]> --
-- All rights reserved. --
-- --
-- Redistribution and use in source and binary forms, with or without --
-- modification, are permitted provided that the following conditions --
-- are met: --
-- --
-- * Redistributions of source code must retain the above copyright --
-- notice, this list of conditions and the following disclaimer. --
-- --
-- * Redistributions in binary form must reproduce the above copyright --
-- notice, this list of conditions and the following disclaimer in the --
-- documentation and/or other materials provided with the distribution. --
-- --
-- * Neither the name of the Vadim Godunko, IE nor the names of its --
-- contributors may be used to endorse or promote products derived from --
-- this software without specific prior written permission. --
-- --
-- THIS SOFTWARE IS PROVIDED BY THE COPYRIGHT HOLDERS AND CONTRIBUTORS --
-- "AS IS" AND ANY EXPRESS OR IMPLIED WARRANTIES, INCLUDING, BUT NOT --
-- LIMITED TO, THE IMPLIED WARRANTIES OF MERCHANTABILITY AND FITNESS FOR --
-- A PARTICULAR PURPOSE ARE DISCLAIMED. IN NO EVENT SHALL THE COPYRIGHT --
-- HOLDER OR CONTRIBUTORS BE LIABLE FOR ANY DIRECT, INDIRECT, INCIDENTAL, --
-- SPECIAL, EXEMPLARY, OR CONSEQUENTIAL DAMAGES (INCLUDING, BUT NOT LIMITED --
-- TO, PROCUREMENT OF SUBSTITUTE GOODS OR SERVICES; LOSS OF USE, DATA, OR --
-- PROFITS; OR BUSINESS INTERRUPTION) HOWEVER CAUSED AND ON ANY THEORY OF --
-- LIABILITY, WHETHER IN CONTRACT, STRICT LIABILITY, OR TORT (INCLUDING --
-- NEGLIGENCE OR OTHERWISE) ARISING IN ANY WAY OUT OF THE USE OF THIS --
-- SOFTWARE, EVEN IF ADVISED OF THE POSSIBILITY OF SUCH DAMAGE. --
-- --
------------------------------------------------------------------------------
-- $Revision$ $Date$
------------------------------------------------------------------------------
-- This file is generated, don't edit it.
------------------------------------------------------------------------------
with AMF.Generic_Collections;
package AMF.Utp.Default_Applications.Collections is
pragma Preelaborate;
package Utp_Default_Application_Collections is
new AMF.Generic_Collections
(Utp_Default_Application,
Utp_Default_Application_Access);
type Set_Of_Utp_Default_Application is
new Utp_Default_Application_Collections.Set with null record;
Empty_Set_Of_Utp_Default_Application : constant Set_Of_Utp_Default_Application;
type Ordered_Set_Of_Utp_Default_Application is
new Utp_Default_Application_Collections.Ordered_Set with null record;
Empty_Ordered_Set_Of_Utp_Default_Application : constant Ordered_Set_Of_Utp_Default_Application;
type Bag_Of_Utp_Default_Application is
new Utp_Default_Application_Collections.Bag with null record;
Empty_Bag_Of_Utp_Default_Application : constant Bag_Of_Utp_Default_Application;
type Sequence_Of_Utp_Default_Application is
new Utp_Default_Application_Collections.Sequence with null record;
Empty_Sequence_Of_Utp_Default_Application : constant Sequence_Of_Utp_Default_Application;
private
Empty_Set_Of_Utp_Default_Application : constant Set_Of_Utp_Default_Application
:= (Utp_Default_Application_Collections.Set with null record);
Empty_Ordered_Set_Of_Utp_Default_Application : constant Ordered_Set_Of_Utp_Default_Application
:= (Utp_Default_Application_Collections.Ordered_Set with null record);
Empty_Bag_Of_Utp_Default_Application : constant Bag_Of_Utp_Default_Application
:= (Utp_Default_Application_Collections.Bag with null record);
Empty_Sequence_Of_Utp_Default_Application : constant Sequence_Of_Utp_Default_Application
:= (Utp_Default_Application_Collections.Sequence with null record);
end AMF.Utp.Default_Applications.Collections;
|
jrmarino/AdaBase | Ada | 21,766 | adb | with AdaBase;
with Connect;
with CommonText;
with Ada.Text_IO;
with Ada.Exceptions;
with Ada.Calendar.Formatting;
with AdaBase.Results.Sets;
with AdaBase.Logger.Facility;
with Interfaces;
with GNAT.Traceback.Symbolic;
procedure All_Types is
package CON renames Connect;
package TIO renames Ada.Text_IO;
package AR renames AdaBase.Results;
package ARS renames AdaBase.Results.Sets;
package CT renames CommonText;
package ALF renames AdaBase.Logger.Facility;
package CAL renames Ada.Calendar;
package CFM renames Ada.Calendar.Formatting;
package SYM renames GNAT.Traceback.Symbolic;
package EX renames Ada.Exceptions;
package Byte_Io is new Ada.Text_Io.Modular_Io (Interfaces.Unsigned_8);
type halfbyte is mod 2 ** 4;
stmt_acc : CON.Stmt_Type_access;
procedure dump_result;
procedure run_bind_test (sql_request : String; direct : Boolean);
function print_time (timevar : CAL.Time) return String;
function print_bits (bitdata : AR.Bits) return String;
function halfbyte_to_hex (value : halfbyte) return Character;
function convert_chain (chain : AR.Chain) return String;
function convert_set (set : AR.Settype) return String;
function pad (S : String; Slen : Natural) return String;
function pad (S : String; Slen : Natural) return String
is
field : String (1 .. Slen) := (others => ' ');
len : Natural := S'Length;
begin
field (1 .. len) := S;
return field;
end pad;
function halfbyte_to_hex (value : halfbyte) return Character
is
zero : constant Natural := Character'Pos ('0');
alpham10 : constant Natural := Character'Pos ('A') - 10;
begin
case value is
when 0 .. 9 => return Character'Val (zero + Natural (value));
when others => return Character'Val (alpham10 + Natural (value));
end case;
end halfbyte_to_hex;
function convert_chain (chain : AR.Chain) return String
is
use type AR.NByte1;
blocks : constant Natural := chain'Length;
mask_ones : constant AR.NByte1 := 16#0F#;
work_4bit : halfbyte;
result : String (1 .. blocks * 3 - 1) := (others => ' ');
index : Natural := 0;
fullbyte : Interfaces.Unsigned_8;
begin
for x in Positive range 1 .. blocks loop
index := index + 1;
fullbyte := Interfaces.Unsigned_8 (chain (x));
fullbyte := Interfaces.Shift_Right (fullbyte, 4);
work_4bit := halfbyte (fullbyte);
result (index) := halfbyte_to_hex (work_4bit);
index := index + 1;
work_4bit := halfbyte (chain (x) and mask_ones);
result (index) := halfbyte_to_hex (work_4bit);
index := index + 1;
end loop;
if blocks = 0 then
return "(empty)";
end if;
return result;
end convert_chain;
function print_bits (bitdata : AR.Bits) return String
is
use type AR.Bit1;
result : String (1 .. bitdata'Length) := (others => '0');
marker : Natural := result'First;
begin
for x in bitdata'Range loop
if bitdata (x) > 0 then
result (marker) := '1';
end if;
marker := marker + 1;
end loop;
return result;
end print_bits;
function convert_set (set : AR.Settype) return String
is
result : CT.Text;
begin
for x in set'Range loop
if not CT.IsBlank (set (x).enumeration) then
if x > set'First then
CT.SU.Append (result, ",");
end if;
CT.SU.Append (result, set (x).enumeration);
end if;
end loop;
return CT.USS (result);
end convert_set;
procedure dump_result
is
row : ARS.Datarow;
numcols : constant Natural := stmt_acc.column_count;
begin
loop
row := stmt_acc.fetch_next;
exit when row.data_exhausted;
for c in Natural range 1 .. numcols loop
TIO.Put (CT.zeropad (c, 2) & ". ");
TIO.Put (pad (stmt_acc.column_name (c), 16));
TIO.Put (pad (stmt_acc.column_native_type (c)'Img, 15));
if row.column (c).is_null then
TIO.Put_Line ("<null>");
else
case stmt_acc.column_native_type (c) is
when AdaBase.ft_chain =>
TIO.Put_Line (convert_chain (row.column (c).as_chain));
when others =>
TIO.Put_Line (row.column (c).as_string);
end case;
end if;
end loop;
end loop;
TIO.Put_Line ("");
end dump_result;
sql1 : constant String := "SELECT nbyte0, nbyte1, nbyte2, id_nbyte3, " &
"nbyte4, nbyte8, byte1, byte2, byte3, byte4, " &
"byte5, real9, real18, exact_decimal, " &
"bit_type, my_date, my_datetime, my_timestamp, " &
"my_time, my_year, fixed_string, " &
"variable_string, my_tinytext, my_text, " &
"my_mediumtext, my_longtext, " &
"enumtype, settype, " &
"my_binary, my_varbinary, " &
"my_tinyblob, my_mediumblob, " &
"my_blob, my_longblob " &
"FROM all_types WHERE id_nbyte3 = 1";
sql2 : constant String := "INSERT INTO all_types VALUES (:id_nbyte3, " &
":nbyte0, :nbyte1, :nbyte2, :nbyte4, :nbyte8, " &
":byte1, :byte2, :byte3, :byte4, :byte8, " &
":real9, :real18, :exact, :bit, :date, " &
":datetime, :timestamp, :time, :year, :fixed, " &
":varstring, :tinytext, :text, :medtext, " &
":longtext, :binary, :varbin, :tinyblob, " &
":medblob, :blob, :longblob, :enumtype, " &
":settype)";
sql3 : constant String := "INSERT INTO all_types (id_nbyte3, nbyte0, " &
"nbyte1, byte2, byte4, nbyte8, real9, real18, " &
"exact_decimal, my_date, my_timestamp, " &
"my_time, my_year, my_tinytext, enumtype, " &
"settype, my_varbinary, my_blob) VALUES " &
"(?,?, ?,?,?,?,?,?, ?,?,?, ?,?,?,?, ?,?,?)";
function print_time (timevar : CAL.Time) return String is
begin
return CFM.Image (timevar);
exception
when others =>
return "<conversion failed>";
end print_time;
procedure run_bind_test (sql_request : String; direct : Boolean)
is
v_nbyte0 : aliased AR.NByte0;
v_nbyte1 : aliased AR.NByte1;
v_nbyte2 : aliased AR.NByte2;
v_nbyte3 : aliased AR.NByte3;
v_nbyte4 : aliased AR.NByte4;
v_nbyte8 : aliased AR.NByte8;
v_byte1 : aliased AR.Byte1;
v_byte2 : aliased AR.Byte2;
v_byte3 : aliased AR.Byte3;
v_byte4 : aliased AR.Byte4;
v_byte8 : aliased AR.Byte8;
v_exact : aliased AR.Real18;
v_real9 : aliased AR.Real9;
v_real18 : aliased AR.Real18;
v_text1 : aliased AR.Textual;
v_text2 : aliased AR.Textual;
v_text3 : aliased AR.Textual;
v_text4 : aliased AR.Textual;
v_text5 : aliased AR.Textual;
v_text6 : aliased AR.Textual;
v_time1 : aliased AR.AC.Time;
v_time2 : aliased AR.AC.Time;
v_time3 : aliased AR.AC.Time;
v_time4 : aliased AR.AC.Time;
v_year : aliased AR.NByte2;
v_bit : aliased AR.Bits := (0 .. 15 => 0);
v_chain1 : aliased AR.Chain := (1 .. 4 => 0);
v_chain2 : aliased AR.Chain := (1 .. 6 => 0);
v_chain3 : aliased AR.Chain := (1 .. 16 => 0);
v_chain4 : aliased AR.Chain := (1 .. 16 => 0);
v_chain5 : aliased AR.Chain := (1 .. 16 => 0);
v_chain6 : aliased AR.Chain := (1 .. 16 => 0);
v_enum : aliased AR.Enumtype;
v_set : aliased AR.Settype := (1 .. 6 => (AR.PARAM_IS_ENUM));
function Toggle (direct : Boolean) return CON.Stmt_Type;
function Toggle (direct : Boolean) return CON.Stmt_Type is
begin
if direct then
return CON.DR.query (sql_request);
else
return CON.DR.prepare (sql_request);
end if;
end Toggle;
stmt : CON.Stmt_Type := Toggle (direct);
begin
if not direct then
if not stmt.execute then
goto done;
end if;
end if;
stmt.bind (1, v_nbyte0'Unchecked_Access);
stmt.bind (2, v_nbyte1'Unchecked_Access);
stmt.bind (3, v_nbyte2'Unchecked_Access);
stmt.bind (4, v_nbyte3'Unchecked_Access);
stmt.bind (5, v_nbyte4'Unchecked_Access);
stmt.bind (6, v_nbyte8'Unchecked_Access);
stmt.bind (7, v_byte1'Unchecked_Access);
stmt.bind (8, v_byte2'Unchecked_Access);
stmt.bind (9, v_byte3'Unchecked_Access);
stmt.bind (10, v_byte4'Unchecked_Access);
stmt.bind (11, v_byte8'Unchecked_Access);
stmt.bind (12, v_real9'Unchecked_Access);
stmt.bind (13, v_real18'Unchecked_Access);
stmt.bind (14, v_exact'Unchecked_Access);
stmt.bind (15, v_bit'Unchecked_Access);
stmt.bind (16, v_time1'Unchecked_Access);
stmt.bind (17, v_time2'Unchecked_Access);
stmt.bind (18, v_time3'Unchecked_Access);
stmt.bind (19, v_time4'Unchecked_Access);
stmt.bind (20, v_year'Unchecked_Access);
stmt.bind (21, v_text1'Unchecked_Access);
stmt.bind (22, v_text2'Unchecked_Access);
stmt.bind (23, v_text3'Unchecked_Access);
stmt.bind (24, v_text4'Unchecked_Access);
stmt.bind (25, v_text5'Unchecked_Access);
stmt.bind (26, v_text6'Unchecked_Access);
stmt.bind (27, v_enum'Unchecked_Access);
stmt.bind (28, v_set'Unchecked_Access);
stmt.bind (29, v_chain1'Unchecked_Access);
stmt.bind (30, v_chain2'Unchecked_Access);
stmt.bind (31, v_chain3'Unchecked_Access);
stmt.bind (32, v_chain4'Unchecked_Access);
stmt.bind (33, v_chain5'Unchecked_Access);
stmt.bind (34, v_chain6'Unchecked_Access);
TIO.Put_Line ("Dumping Result from PS/Bound fetch ...");
loop
exit when not stmt.fetch_bound;
TIO.Put_Line (" 1. nbyte0 " & v_nbyte0'Img);
TIO.Put_Line (" 2. nbyte1 " & v_nbyte1'Img);
TIO.Put_Line (" 3. nbyte2 " & v_nbyte2'Img);
TIO.Put_Line (" 4. nbyte3 " & v_nbyte3'Img);
TIO.Put_Line (" 5. nbyte4 " & v_nbyte4'Img);
TIO.Put_Line (" 6. nbyte8 " & v_nbyte8'Img);
TIO.Put_Line (" 7. byte1 " & v_byte1'Img);
TIO.Put_Line (" 8. byte2 " & v_byte2'Img);
TIO.Put_Line (" 9. byte3 " & v_byte3'Img);
TIO.Put_Line ("10. byte4 " & v_byte4'Img);
TIO.Put_Line ("11. byte8 " & v_byte8'Img);
TIO.Put_Line ("12. real9 " & v_real9'Img);
TIO.Put_Line ("13. real18 " & v_real18'Img);
TIO.Put_Line ("14. exact " & v_exact'Img);
TIO.Put_Line ("15. bits " & print_bits (v_bit));
TIO.Put_Line ("16. date " & print_time (v_time1));
TIO.Put_Line ("17. datetime " & print_time (v_time2));
TIO.Put_Line ("18. timestamp " & print_time (v_time3));
TIO.Put_Line ("19. time " & print_time (v_time4));
TIO.Put_Line ("20. year " & v_year'Img);
TIO.Put_Line ("21. fixed string " & CT.USS (v_text1));
TIO.Put_Line ("22. variable string " & CT.USS (v_text2));
TIO.Put_Line ("23. tinytext " & CT.USS (v_text3));
TIO.Put_Line ("24. text " & CT.USS (v_text4));
TIO.Put_Line ("25. medium text " & CT.USS (v_text5));
TIO.Put_Line ("26. long text " & CT.USS (v_text6));
TIO.Put_Line ("27. enum " & CT.USS
(v_enum.enumeration));
TIO.Put_Line ("28. settype " & convert_set (v_set));
TIO.Put_Line ("29. binary " & convert_chain (v_chain1));
TIO.Put_Line ("30. varbinary " & convert_chain (v_chain2));
TIO.Put_Line ("31. tiny blob " & convert_chain (v_chain3));
TIO.Put_Line ("32. medium blob " & convert_chain (v_chain4));
TIO.Put_Line ("33. blob " & convert_chain (v_chain5));
TIO.Put_Line ("34. long blob " & convert_chain (v_chain6));
end loop;
<<done>>
end run_bind_test;
begin
CON.DR.command_standard_logger (device => ALF.file, action => ALF.attach);
CON.connect_database;
declare
stmt : aliased CON.Stmt_Type := CON.DR.query (sql1);
begin
if stmt.successful then
stmt_acc := stmt'Unchecked_Access;
TIO.Put_Line ("Dumping Result from direct statement ...");
dump_result;
end if;
end;
declare
stmt : aliased CON.Stmt_Type := CON.DR.prepare (sql1);
begin
if stmt.execute then
stmt_acc := stmt'Unchecked_Access;
TIO.Put_Line ("Dumping Result from prepared statement ...");
dump_result;
else
TIO.Put_Line ("statement execution failed");
end if;
end;
run_bind_test (sql1, False);
declare
numrows : AdaBase.Affected_Rows;
begin
numrows := CON.DR.execute ("DELETE FROM all_types WHERE id_nbyte3 > 8");
CON.DR.commit;
end;
declare
v_nbyte0 : aliased AR.NByte0 := False;
v_nbyte1 : aliased AR.NByte1 := 22;
v_nbyte2 : aliased AR.NByte2 := 5800;
v_nbyte3 : aliased AR.NByte3 := 9;
v_nbyte4 : aliased AR.NByte4 := AR.NByte4 (2 ** 20);
v_nbyte8 : aliased AR.NByte8 := AR.NByte8 (2 ** 24 + 1);
v_byte1 : aliased AR.Byte1 := AR.Byte1 (-2);
v_byte2 : aliased AR.Byte2 := AR.Byte2 (-132);
v_byte3 : aliased AR.Byte3 := AR.Byte3 (-8000000);
v_byte4 : aliased AR.Byte4 := 24;
v_byte8 : aliased AR.Byte8 := 128;
v_exact : aliased AR.Real9 := 7.32;
v_real9 : aliased AR.Real9 := 999.01234;
v_real18 : aliased AR.Real18 := 99999.01234567890123456789;
v_text1 : aliased AR.Textual := CT.SUS ("Popeye");
v_text2 : aliased AR.Textual := CT.SUS ("Daredevel");
v_text3 : aliased AR.Textual := CT.SUS ("The Punisher");
v_text4 : aliased AR.Textual := CT.SUS ("Electra");
v_text5 : aliased AR.Textual := CT.SUS ("Iron Man");
v_text6 : aliased AR.Textual := CT.SUS ("Bruce Banner");
v_time1 : aliased AR.AC.Time := CFM.Time_Of (1995, 2, 14);
v_time2 : aliased AR.AC.Time := CFM.Time_Of (1998, 3, 17, 6, 7, 8);
v_time3 : aliased AR.AC.Time := CFM.Time_Of (2005, 4, 20, 1, 32, 0);
v_time4 : aliased AR.AC.Time := CFM.Time_Of (1901, 1, 1, 4, 57, 50);
v_year : aliased AR.NByte2 := 1992;
v_bit : aliased AR.Textual := CT.SUS ("010101111111");
v_chain1 : aliased AR.Chain := (12, 44, 65, 240);
v_chain2 : aliased AR.Chain := (97, 99, 102);
v_chain3 : aliased AR.Chain := (1, 0, 20, 37, 10);
v_chain4 : aliased AR.Chain := (200, 232, 98, 100, 77, 82);
v_chain5 : aliased AR.Chain := (50, 12, 2, 4, 99, 255, 27);
v_chain6 : aliased AR.Chain := (0, 0, 0, 0, 1, 2, 3, 4);
v_enum : aliased AR.Enumtype := (enumeration => CT.SUS ("pink"));
v_set : aliased AR.Settype := ((enumeration => CT.SUS ("red")),
(enumeration => CT.SUS ("green")));
v_set2 : AR.Settype := ((enumeration => CT.SUS ("yellow")),
(enumeration => CT.SUS ("white")),
(enumeration => CT.SUS ("red")));
v_chain7 : AR.Chain := (65, 66, 67, 68);
v_chain8 : AR.Chain := (97, 98, 99, 100, 101);
stmt : CON.Stmt_Type := CON.DR.prepare (sql2);
begin
stmt.assign ("nbyte0", v_nbyte0'Unchecked_Access);
stmt.assign ("nbyte1", v_nbyte1'Unchecked_Access);
stmt.assign ("nbyte2", v_nbyte2'Unchecked_Access);
stmt.assign ("id_nbyte3", v_nbyte3'Unchecked_Access);
stmt.assign ("nbyte4", v_nbyte4'Unchecked_Access);
stmt.assign ("nbyte8", v_nbyte8'Unchecked_Access);
stmt.assign ("byte1", v_byte1'Unchecked_Access);
stmt.assign ("byte2", v_byte2'Unchecked_Access);
stmt.assign ("byte3", v_byte3'Unchecked_Access);
stmt.assign ("byte4", v_byte4'Unchecked_Access);
stmt.assign ("byte8", v_byte8'Unchecked_Access);
stmt.assign ("real9", v_real9'Unchecked_Access);
stmt.assign ("real18", v_real18'Unchecked_Access);
stmt.assign ("exact", v_exact'Unchecked_Access);
stmt.assign ("bit", v_bit'Unchecked_Access);
stmt.assign ("date", v_time1'Unchecked_Access);
stmt.assign ("datetime", v_time2'Unchecked_Access);
stmt.assign ("timestamp", v_time3'Unchecked_Access);
stmt.assign ("time", v_time4'Unchecked_Access);
stmt.assign ("year", v_year'Unchecked_Access);
stmt.assign ("fixed", v_text1'Unchecked_Access);
stmt.assign ("varstring", v_text2'Unchecked_Access);
stmt.assign ("tinytext", v_text3'Unchecked_Access);
stmt.assign ("text", v_text4'Unchecked_Access);
stmt.assign ("medtext", v_text5'Unchecked_Access);
stmt.assign ("longtext", v_text6'Unchecked_Access);
stmt.assign ("enumtype", v_enum'Unchecked_Access);
stmt.assign ("settype", v_set'Unchecked_Access);
stmt.assign ("binary", v_chain1'Unchecked_Access);
stmt.assign ("varbin", v_chain2'Unchecked_Access);
stmt.assign ("tinyblob", v_chain3'Unchecked_Access);
stmt.assign ("medblob", v_chain4'Unchecked_Access);
stmt.assign ("blob", v_chain5'Unchecked_Access);
stmt.assign ("longblob", v_chain6'Unchecked_Access);
TIO.Put_Line ("");
if stmt.execute then
TIO.Put_Line ("Inserted" & stmt.rows_affected'Img & " row(s)");
v_nbyte3 := 11;
v_nbyte0 := True;
v_text1 := CT.SUS ("Wolverine");
v_enum.enumeration := CT.SUS ("blue");
if stmt.execute then
TIO.Put_Line ("Inserted" & stmt.rows_affected'Img & " row(s)");
v_nbyte3 := 15;
stmt.assign ("settype", v_set2);
stmt.assign ("binary", v_chain7);
stmt.assign ("varbin", v_chain8);
v_exact := 187.93;
if stmt.execute then
TIO.Put_Line ("Inserted" & stmt.rows_affected'Img &
" row(s)");
CON.DR.commit;
else
TIO.Put_Line (stmt.last_driver_message);
CON.DR.rollback;
end if;
else
TIO.Put_Line (stmt.last_driver_message);
CON.DR.rollback;
end if;
else
TIO.Put_Line (stmt.last_driver_message);
end if;
end;
declare
values : String := "20|1|150|-10|-90000|3200100|87.2341|" &
"15555.213792831213|875.44|2014-10-20|2000-03-25 15:15:00|" &
"20:18:13|1986|AdaBase is so cool!|green|yellow,black|" &
" 0123|456789ABC.,z[]";
stmt : CON.Stmt_Type := CON.DR.prepare (sql3);
begin
values (values'Last - 6) := Character'Val (0);
-- This has to be done only once after the prepare command
-- Set the type for each parameter (required for at least MySQL)
stmt.assign (1, AR.PARAM_IS_NBYTE_3);
stmt.assign (2, AR.PARAM_IS_BOOLEAN);
stmt.assign (3, AR.PARAM_IS_NBYTE_1);
stmt.assign (4, AR.PARAM_IS_BYTE_2);
stmt.assign (5, AR.PARAM_IS_BYTE_4);
stmt.assign (6, AR.PARAM_IS_NBYTE_8);
stmt.assign (7, AR.PARAM_IS_REAL_9);
stmt.assign (8, AR.PARAM_IS_REAL_18);
stmt.assign (9, AR.PARAM_IS_REAL_18);
stmt.assign (10, AR.PARAM_IS_TIMESTAMP);
stmt.assign (11, AR.PARAM_IS_TIMESTAMP);
stmt.assign (12, AR.PARAM_IS_TIMESTAMP);
stmt.assign (13, AR.PARAM_IS_NBYTE_2);
stmt.assign (14, AR.PARAM_IS_TEXTUAL);
stmt.assign (15, AR.PARAM_IS_ENUM);
stmt.assign (16, AR.PARAM_IS_SET);
stmt.assign (17, AR.PARAM_IS_CHAIN);
stmt.assign (18, AR.PARAM_IS_CHAIN);
if stmt.execute (values) then
TIO.Put_Line ("Inserted" & stmt.rows_affected'Img & " row(s)");
CON.DR.commit;
else
TIO.Put_Line ("statement execution failed");
TIO.Put_Line (stmt.last_driver_message);
end if;
end;
declare
sql20 : String := sql1 (sql1'First .. sql1'Last - 1) & "20";
stmt : aliased CON.Stmt_Type := CON.DR.query (sql20);
begin
if stmt.successful then
stmt_acc := stmt'Unchecked_Access;
TIO.Put_Line ("Dumping Result from last insert ...");
dump_result;
end if;
end;
declare
sql20 : String := sql1 (sql1'First .. sql1'Last - 1) & "20";
begin
run_bind_test (sql20, False);
TIO.Put_Line ("");
run_bind_test (sql20, True);
end;
CON.DR.disconnect;
exception
when E : others =>
TIO.Put_Line ("");
TIO.Put_Line ("exception name: " & EX.Exception_Name (E));
TIO.Put_Line ("exception msg : " & EX.Exception_Message (E));
TIO.Put_Line ("Traceback:");
TIO.Put_Line (SYM.Symbolic_Traceback (E));
end All_Types;
|
pyjarrett/progress_indicators | Ada | 2,526 | ads | -- SPDX-License-Identifier: Apache-2.0
--
-- Copyright (c) 2021 The progress_indicators authors
--
-- 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 Progress_Indicators.Spinners is
-- It's always fun to have a fun spinning indicator while waiting for
-- terminal work to complete. This is just a simple reusable version useful
-- for tasks monitoring work to indicate that the process isn't dead.
type Spinner is private;
type Spinner_Style is (Empty, In_Place, Normal);
-- What happens when you get the value of the spinner?
--
-- Empty returns an empty string, useful for disabling spinners when not
-- running interactively.
--
-- In_Place inserts the appropriate ANSI escape sequence after the moving
-- bar to overwrite in-place when called with `Put` in sequence.
--
-- Normal just returns the next moving bar.
function Make (Style : Spinner_Style := In_Place; Ticks_Per_Move : Positive := 1) return Spinner;
-- Makes a new spinner which goes to the next element every given number of
-- ticks, allowing you to vary spin rate.
--
-- "In Place" prepends the appropriate ANSI escape sequence such that
-- calling Put(Value(Spinner)) will spin in-place.
function Value (S : Spinner) return String;
procedure Tick (S : in out Spinner);
procedure Enable_All;
-- Global switch to allow spinners to be printed. Spinners are enabled by
-- default.
procedure Disable_All;
-- Global switch to turn all spinners into empty spinners.
private
Spinners_Enabled : Boolean := True;
type Spinner_State is mod 4;
Spinner_States : constant array (Spinner_State) of Character := ('/', '-', '\', '|');
type Spinner is record
Ticks_Per_Move : Positive;
Ticks : Natural;
State : Spinner_State;
Style : Spinner_Style;
end record with
Type_Invariant => Ticks < Ticks_Per_Move;
end Progress_Indicators.Spinners;
|
AdaCore/Ada_Drivers_Library | Ada | 2,996 | adb | ------------------------------------------------------------------------------
-- --
-- Copyright (C) 2019, AdaCore --
-- --
-- Redistribution and use in source and binary forms, with or without --
-- modification, are permitted provided that the following conditions are --
-- met: --
-- 1. Redistributions of source code must retain the above copyright --
-- notice, this list of conditions and the following disclaimer. --
-- 2. Redistributions in binary form must reproduce the above copyright --
-- notice, this list of conditions and the following disclaimer in --
-- the documentation and/or other materials provided with the --
-- distribution. --
-- 3. Neither the name of the copyright holder nor the names of its --
-- contributors may be used to endorse or promote products derived --
-- from this software without specific prior written permission. --
-- --
-- THIS SOFTWARE IS PROVIDED BY THE COPYRIGHT HOLDERS AND CONTRIBUTORS --
-- "AS IS" AND ANY EXPRESS OR IMPLIED WARRANTIES, INCLUDING, BUT NOT --
-- LIMITED TO, THE IMPLIED WARRANTIES OF MERCHANTABILITY AND FITNESS FOR --
-- A PARTICULAR PURPOSE ARE DISCLAIMED. IN NO EVENT SHALL THE COPYRIGHT --
-- HOLDER OR CONTRIBUTORS BE LIABLE FOR ANY DIRECT, INDIRECT, INCIDENTAL, --
-- SPECIAL, EXEMPLARY, OR CONSEQUENTIAL DAMAGES (INCLUDING, BUT NOT --
-- LIMITED TO, PROCUREMENT OF SUBSTITUTE GOODS OR SERVICES; LOSS OF USE, --
-- DATA, OR PROFITS; OR BUSINESS INTERRUPTION) HOWEVER CAUSED AND ON ANY --
-- THEORY OF LIABILITY, WHETHER IN CONTRACT, STRICT LIABILITY, OR TORT --
-- (INCLUDING NEGLIGENCE OR OTHERWISE) ARISING IN ANY WAY OUT OF THE USE --
-- OF THIS SOFTWARE, EVEN IF ADVISED OF THE POSSIBILITY OF SUCH DAMAGE. --
-- --
------------------------------------------------------------------------------
package body AdaFruit.CharlieWing is
-----------------
-- LED_Address --
-----------------
overriding
function LED_Address (This : Device;
X : IS31FL3731.X_Coord;
Y : IS31FL3731.Y_Coord)
return IS31FL3731.LED_Id
is
pragma Unreferenced (This);
X2 : Natural := X;
Y2 : Natural := Y;
begin
if X2 > 7 then
X2 := 15 - X2;
Y2 := Y2 + 8;
else
Y2 := 7 - Y2;
end if;
return IS31FL3731.LED_Id (X2 * 16 + Y2);
end LED_Address;
end AdaFruit.CharlieWing;
|
reznikmm/matreshka | Ada | 3,814 | ads | ------------------------------------------------------------------------------
-- --
-- Matreshka Project --
-- --
-- Open Document Toolkit --
-- --
-- Runtime Library Component --
-- --
------------------------------------------------------------------------------
-- --
-- Copyright © 2013, Vadim Godunko <[email protected]> --
-- All rights reserved. --
-- --
-- Redistribution and use in source and binary forms, with or without --
-- modification, are permitted provided that the following conditions --
-- are met: --
-- --
-- * Redistributions of source code must retain the above copyright --
-- notice, this list of conditions and the following disclaimer. --
-- --
-- * Redistributions in binary form must reproduce the above copyright --
-- notice, this list of conditions and the following disclaimer in the --
-- documentation and/or other materials provided with the distribution. --
-- --
-- * Neither the name of the Vadim Godunko, IE nor the names of its --
-- contributors may be used to endorse or promote products derived from --
-- this software without specific prior written permission. --
-- --
-- THIS SOFTWARE IS PROVIDED BY THE COPYRIGHT HOLDERS AND CONTRIBUTORS --
-- "AS IS" AND ANY EXPRESS OR IMPLIED WARRANTIES, INCLUDING, BUT NOT --
-- LIMITED TO, THE IMPLIED WARRANTIES OF MERCHANTABILITY AND FITNESS FOR --
-- A PARTICULAR PURPOSE ARE DISCLAIMED. IN NO EVENT SHALL THE COPYRIGHT --
-- HOLDER OR CONTRIBUTORS BE LIABLE FOR ANY DIRECT, INDIRECT, INCIDENTAL, --
-- SPECIAL, EXEMPLARY, OR CONSEQUENTIAL DAMAGES (INCLUDING, BUT NOT LIMITED --
-- TO, PROCUREMENT OF SUBSTITUTE GOODS OR SERVICES; LOSS OF USE, DATA, OR --
-- PROFITS; OR BUSINESS INTERRUPTION) HOWEVER CAUSED AND ON ANY THEORY OF --
-- LIABILITY, WHETHER IN CONTRACT, STRICT LIABILITY, OR TORT (INCLUDING --
-- NEGLIGENCE OR OTHERWISE) ARISING IN ANY WAY OUT OF THE USE OF THIS --
-- SOFTWARE, EVEN IF ADVISED OF THE POSSIBILITY OF SUCH DAMAGE. --
-- --
------------------------------------------------------------------------------
-- $Revision$ $Date$
------------------------------------------------------------------------------
package Matreshka.ODF_Attributes.Style.Rel_Column_Width is
type Style_Rel_Column_Width_Node is
new Matreshka.ODF_Attributes.Style.Style_Node_Base with null record;
type Style_Rel_Column_Width_Access is
access all Style_Rel_Column_Width_Node'Class;
overriding function Get_Local_Name
(Self : not null access constant Style_Rel_Column_Width_Node)
return League.Strings.Universal_String;
end Matreshka.ODF_Attributes.Style.Rel_Column_Width;
|
optikos/oasis | Ada | 3,973 | ads | -- Copyright (c) 2019 Maxim Reznik <[email protected]>
--
-- SPDX-License-Identifier: MIT
-- License-Filename: LICENSE
-------------------------------------------------------------
with Program.Elements.Declarations;
with Program.Lexical_Elements;
with Program.Elements.Defining_Identifiers;
with Program.Elements.Parameter_Specifications;
with Program.Elements.Expressions;
with Program.Elements.Aspect_Specifications;
package Program.Elements.Formal_Procedure_Declarations is
pragma Pure (Program.Elements.Formal_Procedure_Declarations);
type Formal_Procedure_Declaration is
limited interface and Program.Elements.Declarations.Declaration;
type Formal_Procedure_Declaration_Access is
access all Formal_Procedure_Declaration'Class with Storage_Size => 0;
not overriding function Name
(Self : Formal_Procedure_Declaration)
return not null Program.Elements.Defining_Identifiers
.Defining_Identifier_Access is abstract;
not overriding function Parameters
(Self : Formal_Procedure_Declaration)
return Program.Elements.Parameter_Specifications
.Parameter_Specification_Vector_Access is abstract;
not overriding function Subprogram_Default
(Self : Formal_Procedure_Declaration)
return Program.Elements.Expressions.Expression_Access is abstract;
not overriding function Aspects
(Self : Formal_Procedure_Declaration)
return Program.Elements.Aspect_Specifications
.Aspect_Specification_Vector_Access is abstract;
not overriding function Has_Abstract
(Self : Formal_Procedure_Declaration)
return Boolean is abstract;
not overriding function Has_Null
(Self : Formal_Procedure_Declaration)
return Boolean is abstract;
not overriding function Has_Box
(Self : Formal_Procedure_Declaration)
return Boolean is abstract;
type Formal_Procedure_Declaration_Text is limited interface;
type Formal_Procedure_Declaration_Text_Access is
access all Formal_Procedure_Declaration_Text'Class with Storage_Size => 0;
not overriding function To_Formal_Procedure_Declaration_Text
(Self : aliased in out Formal_Procedure_Declaration)
return Formal_Procedure_Declaration_Text_Access is abstract;
not overriding function With_Token
(Self : Formal_Procedure_Declaration_Text)
return not null Program.Lexical_Elements.Lexical_Element_Access
is abstract;
not overriding function Procedure_Token
(Self : Formal_Procedure_Declaration_Text)
return not null Program.Lexical_Elements.Lexical_Element_Access
is abstract;
not overriding function Left_Bracket_Token
(Self : Formal_Procedure_Declaration_Text)
return Program.Lexical_Elements.Lexical_Element_Access is abstract;
not overriding function Right_Bracket_Token
(Self : Formal_Procedure_Declaration_Text)
return Program.Lexical_Elements.Lexical_Element_Access is abstract;
not overriding function Is_Token
(Self : Formal_Procedure_Declaration_Text)
return Program.Lexical_Elements.Lexical_Element_Access is abstract;
not overriding function Abstract_Token
(Self : Formal_Procedure_Declaration_Text)
return Program.Lexical_Elements.Lexical_Element_Access is abstract;
not overriding function Null_Token
(Self : Formal_Procedure_Declaration_Text)
return Program.Lexical_Elements.Lexical_Element_Access is abstract;
not overriding function Box_Token
(Self : Formal_Procedure_Declaration_Text)
return Program.Lexical_Elements.Lexical_Element_Access is abstract;
not overriding function With_Token_2
(Self : Formal_Procedure_Declaration_Text)
return Program.Lexical_Elements.Lexical_Element_Access is abstract;
not overriding function Semicolon_Token
(Self : Formal_Procedure_Declaration_Text)
return not null Program.Lexical_Elements.Lexical_Element_Access
is abstract;
end Program.Elements.Formal_Procedure_Declarations;
|
AdaCore/libadalang | Ada | 50 | ads | with GP;
with Q;
package P is new GP (Q.T, Q.X);
|
reznikmm/matreshka | Ada | 4,703 | adb | ------------------------------------------------------------------------------
-- --
-- Matreshka Project --
-- --
-- Open Document Toolkit --
-- --
-- Runtime Library Component --
-- --
------------------------------------------------------------------------------
-- --
-- Copyright © 2014, Vadim Godunko <[email protected]> --
-- All rights reserved. --
-- --
-- Redistribution and use in source and binary forms, with or without --
-- modification, are permitted provided that the following conditions --
-- are met: --
-- --
-- * Redistributions of source code must retain the above copyright --
-- notice, this list of conditions and the following disclaimer. --
-- --
-- * Redistributions in binary form must reproduce the above copyright --
-- notice, this list of conditions and the following disclaimer in the --
-- documentation and/or other materials provided with the distribution. --
-- --
-- * Neither the name of the Vadim Godunko, IE nor the names of its --
-- contributors may be used to endorse or promote products derived from --
-- this software without specific prior written permission. --
-- --
-- THIS SOFTWARE IS PROVIDED BY THE COPYRIGHT HOLDERS AND CONTRIBUTORS --
-- "AS IS" AND ANY EXPRESS OR IMPLIED WARRANTIES, INCLUDING, BUT NOT --
-- LIMITED TO, THE IMPLIED WARRANTIES OF MERCHANTABILITY AND FITNESS FOR --
-- A PARTICULAR PURPOSE ARE DISCLAIMED. IN NO EVENT SHALL THE COPYRIGHT --
-- HOLDER OR CONTRIBUTORS BE LIABLE FOR ANY DIRECT, INDIRECT, INCIDENTAL, --
-- SPECIAL, EXEMPLARY, OR CONSEQUENTIAL DAMAGES (INCLUDING, BUT NOT LIMITED --
-- TO, PROCUREMENT OF SUBSTITUTE GOODS OR SERVICES; LOSS OF USE, DATA, OR --
-- PROFITS; OR BUSINESS INTERRUPTION) HOWEVER CAUSED AND ON ANY THEORY OF --
-- LIABILITY, WHETHER IN CONTRACT, STRICT LIABILITY, OR TORT (INCLUDING --
-- NEGLIGENCE OR OTHERWISE) ARISING IN ANY WAY OUT OF THE USE OF THIS --
-- SOFTWARE, EVEN IF ADVISED OF THE POSSIBILITY OF SUCH DAMAGE. --
-- --
------------------------------------------------------------------------------
-- $Revision$ $Date$
------------------------------------------------------------------------------
with Matreshka.DOM_Documents;
with Matreshka.ODF_String_Constants;
with ODF.DOM.Iterators;
with ODF.DOM.Visitors;
package body Matreshka.ODF_Presentation.Mouse_Visible_Attributes is
------------
-- Create --
------------
overriding function Create
(Parameters : not null access Matreshka.DOM_Attributes.Attribute_L2_Parameters)
return Presentation_Mouse_Visible_Attribute_Node is
begin
return Self : Presentation_Mouse_Visible_Attribute_Node do
Matreshka.ODF_Presentation.Constructors.Initialize
(Self'Unchecked_Access,
Parameters.Document,
Matreshka.ODF_String_Constants.Presentation_Prefix);
end return;
end Create;
--------------------
-- Get_Local_Name --
--------------------
overriding function Get_Local_Name
(Self : not null access constant Presentation_Mouse_Visible_Attribute_Node)
return League.Strings.Universal_String
is
pragma Unreferenced (Self);
begin
return Matreshka.ODF_String_Constants.Mouse_Visible_Attribute;
end Get_Local_Name;
begin
Matreshka.DOM_Documents.Register_Attribute
(Matreshka.ODF_String_Constants.Presentation_URI,
Matreshka.ODF_String_Constants.Mouse_Visible_Attribute,
Presentation_Mouse_Visible_Attribute_Node'Tag);
end Matreshka.ODF_Presentation.Mouse_Visible_Attributes;
|
reznikmm/matreshka | Ada | 3,596 | adb | ------------------------------------------------------------------------------
-- --
-- Matreshka Project --
-- --
-- Ada Modeling Framework --
-- --
-- Runtime Library Component --
-- --
------------------------------------------------------------------------------
-- --
-- Copyright © 2015, Vadim Godunko <[email protected]> --
-- All rights reserved. --
-- --
-- Redistribution and use in source and binary forms, with or without --
-- modification, are permitted provided that the following conditions --
-- are met: --
-- --
-- * Redistributions of source code must retain the above copyright --
-- notice, this list of conditions and the following disclaimer. --
-- --
-- * Redistributions in binary form must reproduce the above copyright --
-- notice, this list of conditions and the following disclaimer in the --
-- documentation and/or other materials provided with the distribution. --
-- --
-- * Neither the name of the Vadim Godunko, IE nor the names of its --
-- contributors may be used to endorse or promote products derived from --
-- this software without specific prior written permission. --
-- --
-- THIS SOFTWARE IS PROVIDED BY THE COPYRIGHT HOLDERS AND CONTRIBUTORS --
-- "AS IS" AND ANY EXPRESS OR IMPLIED WARRANTIES, INCLUDING, BUT NOT --
-- LIMITED TO, THE IMPLIED WARRANTIES OF MERCHANTABILITY AND FITNESS FOR --
-- A PARTICULAR PURPOSE ARE DISCLAIMED. IN NO EVENT SHALL THE COPYRIGHT --
-- HOLDER OR CONTRIBUTORS BE LIABLE FOR ANY DIRECT, INDIRECT, INCIDENTAL, --
-- SPECIAL, EXEMPLARY, OR CONSEQUENTIAL DAMAGES (INCLUDING, BUT NOT LIMITED --
-- TO, PROCUREMENT OF SUBSTITUTE GOODS OR SERVICES; LOSS OF USE, DATA, OR --
-- PROFITS; OR BUSINESS INTERRUPTION) HOWEVER CAUSED AND ON ANY THEORY OF --
-- LIABILITY, WHETHER IN CONTRACT, STRICT LIABILITY, OR TORT (INCLUDING --
-- NEGLIGENCE OR OTHERWISE) ARISING IN ANY WAY OUT OF THE USE OF THIS --
-- SOFTWARE, EVEN IF ADVISED OF THE POSSIBILITY OF SUCH DAMAGE. --
-- --
------------------------------------------------------------------------------
-- $Revision$ $Date$
------------------------------------------------------------------------------
package body AMF3.Slots.Collections is
---------
-- Get --
---------
overriding function Get
(Self : Object_Slot) return League.Holders.Holder is
begin
return H : League.Holders.Holder;
end Get;
end AMF3.Slots.Collections;
|
AdaCore/Ada_Drivers_Library | Ada | 2,551 | ads | ------------------------------------------------------------------------------
-- --
-- Copyright (C) 2016-2020, AdaCore --
-- --
-- Redistribution and use in source and binary forms, with or without --
-- modification, are permitted provided that the following conditions are --
-- met: --
-- 1. Redistributions of source code must retain the above copyright --
-- notice, this list of conditions and the following disclaimer. --
-- 2. Redistributions in binary form must reproduce the above copyright --
-- notice, this list of conditions and the following disclaimer in --
-- the documentation and/or other materials provided with the --
-- distribution. --
-- 3. Neither the name of the copyright holder nor the names of its --
-- contributors may be used to endorse or promote products derived --
-- from this software without specific prior written permission. --
-- --
-- THIS SOFTWARE IS PROVIDED BY THE COPYRIGHT HOLDERS AND CONTRIBUTORS --
-- "AS IS" AND ANY EXPRESS OR IMPLIED WARRANTIES, INCLUDING, BUT NOT --
-- LIMITED TO, THE IMPLIED WARRANTIES OF MERCHANTABILITY AND FITNESS FOR --
-- A PARTICULAR PURPOSE ARE DISCLAIMED. IN NO EVENT SHALL THE COPYRIGHT --
-- HOLDER OR CONTRIBUTORS BE LIABLE FOR ANY DIRECT, INDIRECT, INCIDENTAL, --
-- SPECIAL, EXEMPLARY, OR CONSEQUENTIAL DAMAGES (INCLUDING, BUT NOT --
-- LIMITED TO, PROCUREMENT OF SUBSTITUTE GOODS OR SERVICES; LOSS OF USE, --
-- DATA, OR PROFITS; OR BUSINESS INTERRUPTION) HOWEVER CAUSED AND ON ANY --
-- THEORY OF LIABILITY, WHETHER IN CONTRACT, STRICT LIABILITY, OR TORT --
-- (INCLUDING NEGLIGENCE OR OTHERWISE) ARISING IN ANY WAY OUT OF THE USE --
-- OF THIS SOFTWARE, EVEN IF ADVISED OF THE POSSIBILITY OF SUCH DAMAGE. --
-- --
------------------------------------------------------------------------------
with HAL; use HAL;
package nRF.RNG is
procedure Enable_Digital_Error_Correction;
procedure Disable_Digital_Error_Correction;
function Read return UInt8;
end nRF.RNG;
|
reznikmm/matreshka | Ada | 4,674 | adb | ------------------------------------------------------------------------------
-- --
-- Matreshka Project --
-- --
-- Localization, Internationalization, Globalization for Ada --
-- --
-- Runtime Library Component --
-- --
------------------------------------------------------------------------------
-- --
-- Copyright © 2010-2014, Vadim Godunko <[email protected]> --
-- All rights reserved. --
-- --
-- Redistribution and use in source and binary forms, with or without --
-- modification, are permitted provided that the following conditions --
-- are met: --
-- --
-- * Redistributions of source code must retain the above copyright --
-- notice, this list of conditions and the following disclaimer. --
-- --
-- * Redistributions in binary form must reproduce the above copyright --
-- notice, this list of conditions and the following disclaimer in the --
-- documentation and/or other materials provided with the distribution. --
-- --
-- * Neither the name of the Vadim Godunko, IE nor the names of its --
-- contributors may be used to endorse or promote products derived from --
-- this software without specific prior written permission. --
-- --
-- THIS SOFTWARE IS PROVIDED BY THE COPYRIGHT HOLDERS AND CONTRIBUTORS --
-- "AS IS" AND ANY EXPRESS OR IMPLIED WARRANTIES, INCLUDING, BUT NOT --
-- LIMITED TO, THE IMPLIED WARRANTIES OF MERCHANTABILITY AND FITNESS FOR --
-- A PARTICULAR PURPOSE ARE DISCLAIMED. IN NO EVENT SHALL THE COPYRIGHT --
-- HOLDER OR CONTRIBUTORS BE LIABLE FOR ANY DIRECT, INDIRECT, INCIDENTAL, --
-- SPECIAL, EXEMPLARY, OR CONSEQUENTIAL DAMAGES (INCLUDING, BUT NOT LIMITED --
-- TO, PROCUREMENT OF SUBSTITUTE GOODS OR SERVICES; LOSS OF USE, DATA, OR --
-- PROFITS; OR BUSINESS INTERRUPTION) HOWEVER CAUSED AND ON ANY THEORY OF --
-- LIABILITY, WHETHER IN CONTRACT, STRICT LIABILITY, OR TORT (INCLUDING --
-- NEGLIGENCE OR OTHERWISE) ARISING IN ANY WAY OUT OF THE USE OF THIS --
-- SOFTWARE, EVEN IF ADVISED OF THE POSSIBILITY OF SUCH DAMAGE. --
-- --
------------------------------------------------------------------------------
-- $Revision$ $Date$
------------------------------------------------------------------------------
with Matreshka.Internals.Translator.XLIFF_Readers;
with XML.SAX.Input_Sources.Streams.Files;
with XML.SAX.Simple_Readers;
package body League.Translator is
--------------
-- Finalize --
--------------
procedure Finalize is
begin
null;
end Finalize;
----------------
-- Initialize --
----------------
procedure Initialize (File : League.Strings.Universal_String) is
Source : aliased XML.SAX.Input_Sources.Streams.Files.File_Input_Source;
Handler :
aliased Matreshka.Internals.Translator.XLIFF_Readers.XLIFF_Reader;
Reader : aliased XML.SAX.Simple_Readers.Simple_Reader;
begin
Source.Open_By_File_Name (File);
Reader.Set_Content_Handler (Handler'Unchecked_Access);
Reader.Parse (Source'Unchecked_Access);
end Initialize;
---------------
-- Translate --
---------------
function Translate
(Compilation_Unit : League.Strings.Universal_String;
Source_Text : League.Strings.Universal_String;
Disambiguation : League.Strings.Universal_String
:= League.Strings.Empty_Universal_String)
return League.Strings.Universal_String is
begin
return
Matreshka.Internals.Translator.Translate
(Compilation_Unit, Source_Text, Disambiguation);
end Translate;
end League.Translator;
|
zhmu/ananas | Ada | 2,935 | ads | ------------------------------------------------------------------------------
-- --
-- GNAT COMPILER COMPONENTS --
-- --
-- G N A T . W I D E _ S T R I N G _ S P L I T --
-- --
-- S p e c --
-- --
-- Copyright (C) 2002-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. --
-- --
------------------------------------------------------------------------------
-- Useful wide_string-manipulation routines: given a set of separators, split
-- a wide_string wherever the separators appear, and provide direct access
-- to the resulting slices. See GNAT.Array_Split for full documentation.
with Ada.Strings.Wide_Maps; use Ada.Strings;
with GNAT.Array_Split;
package GNAT.Wide_String_Split is new GNAT.Array_Split
(Element => Wide_Character,
Element_Sequence => Wide_String,
Element_Set => Wide_Maps.Wide_Character_Set,
To_Set => Wide_Maps.To_Set,
Is_In => Wide_Maps.Is_In);
|
DrenfongWong/tkm-rpc | Ada | 948 | ads | with Tkmrpc.Types;
with Tkmrpc.Operations.Ike;
package Tkmrpc.Request.Ike.Tkm_Reset is
Data_Size : constant := 0;
Padding_Size : constant := Request.Body_Size - Data_Size;
subtype Padding_Range is Natural range 1 .. Padding_Size;
subtype Padding_Type is Types.Byte_Sequence (Padding_Range);
type Request_Type is record
Header : Request.Header_Type;
Padding : Padding_Type;
end record;
for Request_Type use record
Header at 0 range 0 .. (Request.Header_Size * 8) - 1;
Padding at Request.Header_Size + Data_Size range
0 .. (Padding_Size * 8) - 1;
end record;
for Request_Type'Size use Request.Request_Size * 8;
Null_Request : constant Request_Type :=
Request_Type'
(Header =>
Request.Header_Type'(Operation => Operations.Ike.Tkm_Reset,
Request_Id => 0),
Padding => Padding_Type'(others => 0));
end Tkmrpc.Request.Ike.Tkm_Reset;
|
zhmu/ananas | Ada | 19,948 | adb | ------------------------------------------------------------------------------
-- --
-- GNAT COMPILER COMPONENTS --
-- --
-- F R O N T E N D --
-- --
-- B o d y --
-- --
-- Copyright (C) 1992-2022, Free Software Foundation, Inc. --
-- --
-- GNAT is free software; you can redistribute it and/or modify it under --
-- terms of the GNU General Public License as published by the Free Soft- --
-- ware Foundation; either version 3, or (at your option) any later ver- --
-- sion. GNAT is distributed in the hope that it will be useful, but WITH- --
-- OUT ANY WARRANTY; without even the implied warranty of MERCHANTABILITY --
-- or FITNESS FOR A PARTICULAR PURPOSE. See the GNU General Public License --
-- for more details. You should have received a copy of the GNU General --
-- Public License distributed with GNAT; see file COPYING3. If not, go to --
-- http://www.gnu.org/licenses for a complete copy of the license. --
-- --
-- GNAT was originally developed by the GNAT team at New York University. --
-- Extensive contributions were provided by Ada Core Technologies Inc. --
-- --
------------------------------------------------------------------------------
with System.Strings; use System.Strings;
with Atree; use Atree;
with Checks;
with CStand;
with Debug; use Debug;
with Elists;
with Exp_Dbug;
with Exp_Unst;
with Fmap;
with Fname.UF;
with Ghost; use Ghost;
with Inline; use Inline;
with Lib; use Lib;
with Lib.Load; use Lib.Load;
with Lib.Xref;
with Live; use Live;
with Namet; use Namet;
with Nlists; use Nlists;
with Opt; use Opt;
with Osint;
with Par;
with Prep;
with Prepcomp;
with Restrict; use Restrict;
with Rident; use Rident;
with Rtsfind;
with Snames; use Snames;
with Sprint;
with Scn; use Scn;
with Sem; use Sem;
with Sem_Aux;
with Sem_Ch8;
with Sem_SCIL;
with Sem_Elab; use Sem_Elab;
with Sem_Prag; use Sem_Prag;
with Sem_Warn;
with Sinfo; use Sinfo;
with Sinfo.Nodes; use Sinfo.Nodes;
with Sinfo.Utils; use Sinfo.Utils;
with Sinput; use Sinput;
with Sinput.L; use Sinput.L;
with SCIL_LL;
with Tbuild; use Tbuild;
with Types; use Types;
with VAST;
procedure Frontend is
begin
-- Carry out package initializations. These are initializations which might
-- logically be performed at elaboration time, were it not for the fact
-- that we may be doing things more than once in the big loop over files.
-- Like elaboration, the order in which these calls are made is in some
-- cases important. For example, Lib cannot be initialized before Namet,
-- since it uses names table entries.
Rtsfind.Initialize;
Nlists.Initialize;
Elists.Initialize;
Lib.Load.Initialize;
Sem_Aux.Initialize;
Sem_Ch8.Initialize;
Sem_Prag.Initialize;
Fname.UF.Initialize;
Checks.Initialize;
Sem_Warn.Initialize;
Prep.Initialize;
Sem_Elab.Initialize;
if Generate_SCIL then
SCIL_LL.Initialize;
end if;
-- Create package Standard
CStand.Create_Standard;
-- Check possible symbol definitions specified by -gnateD switches
Prepcomp.Process_Command_Line_Symbol_Definitions;
-- If -gnatep= was specified, parse the preprocessing data file
if Preprocessing_Data_File /= null then
Name_Len := Preprocessing_Data_File'Length;
Name_Buffer (1 .. Name_Len) := Preprocessing_Data_File.all;
Prepcomp.Parse_Preprocessing_Data_File (Name_Find);
-- Otherwise, check if there were preprocessing symbols on the command
-- line and set preprocessing if there are.
else
Prepcomp.Check_Symbols;
end if;
-- We set Parsing_Main_Extended_Source true here to cover processing of all
-- the configuration pragma files, as well as the main source unit itself.
Parsing_Main_Extended_Source := True;
-- Now that the preprocessing situation is established, we are able to
-- load the main source (this is no longer done by Lib.Load.Initialize).
Lib.Load.Load_Main_Source;
-- Return immediately if the main source could not be found
if Sinput.Main_Source_File <= No_Source_File then
return;
end if;
-- Read and process configuration pragma files if present
declare
Dot_Gnat_Adc : constant File_Name_Type := Name_Find ("./gnat.adc");
Gnat_Adc : constant File_Name_Type := Name_Find ("gnat.adc");
Save_Style_Check : constant Boolean := Opt.Style_Check;
-- Save style check mode so it can be restored later
Config_Pragmas : List_Id := Empty_List;
-- Gather configuration pragmas
Source_Config_File : Source_File_Index;
-- Source reference for -gnatec configuration file
Prag : Node_Id;
begin
-- We always analyze config files with style checks off, since we
-- don't want a miscellaneous gnat.adc that is around to discombobulate
-- intended -gnatg or -gnaty compilations. We also disconnect checking
-- for maximum line length.
Opt.Style_Check := False;
Style_Check := False;
-- Capture current suppress options, which may get modified
Scope_Suppress := Opt.Suppress_Options;
-- First deal with gnat.adc file
if Opt.Config_File then
Source_gnat_adc := Load_Config_File (Gnat_Adc);
-- Case of gnat.adc file present
if Source_gnat_adc > No_Source_File then
-- Parse the gnat.adc file for configuration pragmas
Initialize_Scanner (No_Unit, Source_gnat_adc);
Config_Pragmas := Par (Configuration_Pragmas => True);
-- We add a compilation dependency for gnat.adc so that if it
-- changes, we force a recompilation.
Prepcomp.Add_Dependency (Source_gnat_adc);
end if;
end if;
-- Now deal with specified config pragmas files if there are any
if Opt.Config_File_Names /= null then
-- Loop through config pragmas files
for Index in Opt.Config_File_Names'Range loop
declare
Len : constant Natural := Config_File_Names (Index)'Length;
Str : constant String (1 .. Len) :=
Config_File_Names (Index).all;
Config_Name : constant File_Name_Type := Name_Find (Str);
Temp_File : constant Boolean :=
Len > 4
and then
(Str (Len - 3 .. Len) = ".TMP"
or else
Str (Len - 3 .. Len) = ".tmp");
-- Extension indicating a temporary config file?
begin
-- Skip it if it's the default name, already loaded above.
-- Otherwise, we get confusing warning messages about seeing
-- the same thing twice.
if Config_Name /= Gnat_Adc
and then Config_Name /= Dot_Gnat_Adc
then
-- Load the file, error if we did not find it
Source_Config_File := Load_Config_File (Config_Name);
if Source_Config_File <= No_Source_File then
Osint.Fail
("cannot find configuration pragmas file "
& Config_File_Names (Index).all);
-- If we did find the file, and it is not a temporary file,
-- then we add a compilation dependency for it so that if it
-- changes, we force a recompilation.
elsif not Temp_File then
Prepcomp.Add_Dependency (Source_Config_File);
end if;
-- Parse the config pragmas file, and accumulate results
Initialize_Scanner (No_Unit, Source_Config_File);
Append_List_To
(Config_Pragmas, Par (Configuration_Pragmas => True));
end if;
end;
end loop;
end if;
-- Now analyze all pragmas except those whose analysis must be
-- deferred till after the main unit is analyzed.
if Config_Pragmas /= Error_List
and then Operating_Mode /= Check_Syntax
then
Prag := First (Config_Pragmas);
while Present (Prag) loop
if not Delay_Config_Pragma_Analyze (Prag) then
Analyze_Pragma (Prag);
end if;
Next (Prag);
end loop;
end if;
-- Restore style check, but if config file turned on checks, leave on
Opt.Style_Check := Save_Style_Check or Style_Check;
-- Capture any modifications to suppress options from config pragmas
Opt.Suppress_Options := Scope_Suppress;
-- If a target dependency info file has been read through switch
-- -gnateT=, add it to the dependencies.
if Target_Dependent_Info_Read_Name /= null then
declare
Index : Source_File_Index;
begin
Name_Len := 0;
Add_Str_To_Name_Buffer (Target_Dependent_Info_Read_Name.all);
Index := Load_Config_File (Name_Enter);
Prepcomp.Add_Dependency (Index);
end;
end if;
-- This is where we can capture the value of the compilation unit
-- specific restrictions that have been set by the config pragma
-- files (or from Targparm), for later restoration when processing
-- e.g. subunits.
Save_Config_Cunit_Boolean_Restrictions;
-- If there was a -gnatem switch, initialize the mappings of unit names
-- to file names and of file names to path names from the mapping file.
if Mapping_File_Name /= null then
Fmap.Initialize (Mapping_File_Name.all);
end if;
-- Adjust Optimize_Alignment mode from debug switches if necessary
if Debug_Flag_Dot_SS then
Optimize_Alignment := 'S';
elsif Debug_Flag_Dot_TT then
Optimize_Alignment := 'T';
end if;
-- We have now processed the command line switches, and the
-- configuration pragma files, so this is the point at which we want to
-- capture the values of the configuration switches (see Opt for further
-- details).
Register_Config_Switches;
-- Check for file which contains No_Body pragma
if Source_File_Is_No_Body (Source_Index (Main_Unit)) then
Change_Main_Unit_To_Spec;
end if;
-- Initialize the scanner. Note that we do this after the call to
-- Create_Standard, which uses the scanner in its processing of
-- floating-point bounds.
Initialize_Scanner (Main_Unit, Source_Index (Main_Unit));
-- Here we call the parser to parse the compilation unit (or units in
-- the check syntax mode, but in that case we won't go on to the
-- semantics in any case).
Discard_List (Par (Configuration_Pragmas => False));
Parsing_Main_Extended_Source := False;
-- The main unit is now loaded, and subunits of it can be loaded,
-- without reporting spurious loading circularities.
Set_Loading (Main_Unit, False);
-- Now that the main unit is installed, we can complete the analysis
-- of the pragmas in gnat.adc and the configuration file, that require
-- a context for their semantic processing.
if Config_Pragmas /= Error_List
and then Operating_Mode /= Check_Syntax
-- Do not attempt to process deferred configuration pragmas if the
-- main unit failed to load, to avoid cascaded inconsistencies that
-- can lead to a compiler crash.
and then Fatal_Error (Main_Unit) /= Error_Detected
then
-- Pragmas that require some semantic activity, such as
-- Interrupt_State, cannot be processed until the main unit is
-- installed, because they require a compilation unit on which to
-- attach with_clauses, etc. So analyze them now.
declare
Prag : Node_Id;
begin
Prag := First (Config_Pragmas);
while Present (Prag) loop
-- Guard against the case where a configuration pragma may be
-- split into multiple pragmas and the original rewritten as a
-- null statement.
if Nkind (Prag) = N_Pragma
and then Delay_Config_Pragma_Analyze (Prag)
then
Analyze_Pragma (Prag);
end if;
Next (Prag);
end loop;
end;
end if;
-- If we have restriction No_Exception_Propagation, and we did not have
-- an explicit switch turning off Warn_On_Non_Local_Exception, then turn
-- on this warning by default if we have encountered an exception
-- handler.
if Restriction_Check_Required (No_Exception_Propagation)
and then not No_Warn_On_Non_Local_Exception
and then Exception_Handler_Encountered
then
Warn_On_Non_Local_Exception := True;
end if;
-- Disable Initialize_Scalars for runtime files to avoid circular
-- dependencies.
if Initialize_Scalars
and then Fname.Is_Predefined_File_Name (File_Name (Main_Source_File))
then
Initialize_Scalars := False;
Init_Or_Norm_Scalars := Normalize_Scalars;
end if;
-- Now on to the semantics. Skip if in syntax only mode
if Operating_Mode /= Check_Syntax then
-- Install the configuration pragmas in the tree
Set_Config_Pragmas
(Aux_Decls_Node (Cunit (Main_Unit)), Config_Pragmas);
-- Following steps are skipped if we had a fatal error during parsing
if Fatal_Error (Main_Unit) /= Error_Detected then
-- Reset Operating_Mode to Check_Semantics for subunits. We cannot
-- actually generate code for subunits, so we suppress expansion.
-- This also corrects certain problems that occur if we try to
-- incorporate subunits at a lower level.
if Operating_Mode = Generate_Code
and then Nkind (Unit (Cunit (Main_Unit))) = N_Subunit
then
Operating_Mode := Check_Semantics;
end if;
-- Analyze (and possibly expand) main unit
Scope_Suppress := Suppress_Options;
Semantics (Cunit (Main_Unit));
-- Cleanup processing after completing main analysis
-- In GNATprove_Mode we do not perform most expansions but body
-- instantiation is needed.
pragma Assert
(Operating_Mode = Generate_Code
or else Operating_Mode = Check_Semantics);
if Operating_Mode = Generate_Code
or else GNATprove_Mode
then
Instantiate_Bodies;
end if;
-- Analyze all inlined bodies, check access-before-elaboration
-- rules, and remove ignored Ghost code when generating code or
-- compiling for GNATprove.
if Operating_Mode = Generate_Code or else GNATprove_Mode then
if Inline_Processing_Required then
Analyze_Inlined_Bodies;
end if;
-- Remove entities from program that do not have any execution
-- time references.
if Debug_Flag_UU then
Collect_Garbage_Entities;
end if;
if Legacy_Elaboration_Checks then
Check_Elab_Calls;
end if;
-- Examine all top level scenarios collected during analysis
-- and resolution. Diagnose conditional ABEs, install run-time
-- checks to catch conditional ABEs, and guarantee the prior
-- elaboration of external units.
Check_Elaboration_Scenarios;
-- Examine all top level scenarios collected during analysis and
-- resolution in order to diagnose conditional ABEs, even in the
-- presence of serious errors.
else
Check_Elaboration_Scenarios;
end if;
-- List library units if requested
if List_Units then
Lib.List;
end if;
-- Output waiting warning messages
Lib.Xref.Process_Deferred_References;
Sem_Warn.Output_Non_Modified_In_Out_Warnings;
Sem_Warn.Output_Unreferenced_Messages;
Sem_Warn.Check_Unused_Withs;
Sem_Warn.Output_Unused_Warnings_Off_Warnings;
-- Remove any ignored Ghost code as it must not appear in the
-- executable. This action must be performed very late because it
-- heavily alters the tree.
if Operating_Mode = Generate_Code or else GNATprove_Mode then
Remove_Ignored_Ghost_Code;
end if;
-- At this stage we can unnest subprogram bodies if required
if Total_Errors_Detected = 0 then
Exp_Unst.Unnest_Subprograms (Cunit (Main_Unit));
end if;
end if;
end if;
end;
-- Qualify all entity names in inner packages, package bodies, etc
if not GNATprove_Mode then
Exp_Dbug.Qualify_All_Entity_Names;
end if;
-- SCIL backend requirement. Check that SCIL nodes associated with
-- dispatching calls reference subprogram calls.
if Generate_SCIL then
pragma Debug (Sem_SCIL.Check_SCIL_Nodes (Cunit (Main_Unit)));
null;
end if;
-- Verify the validity of the tree
if Debug_Flag_Underscore_VV then
VAST.Check_Tree (Cunit (Main_Unit));
end if;
-- Dump the source now. Note that we do this as soon as the analysis
-- of the tree is complete, because it is not just a dump in the case
-- of -gnatD, where it rewrites all source locations in the tree.
Sprint.Source_Dump;
-- Check again for configuration pragmas that appear in the context
-- of the main unit. These pragmas only affect the main unit, and the
-- corresponding flag is reset after each call to Semantics, but they
-- may affect the generated ali for the unit, and therefore the flag
-- must be set properly after compilation. Currently we only check for
-- Initialize_Scalars, but others should be checked: as well???
declare
Item : Node_Id;
begin
Item := First (Context_Items (Cunit (Main_Unit)));
while Present (Item) loop
if Nkind (Item) = N_Pragma
and then Pragma_Name (Item) = Name_Initialize_Scalars
then
Initialize_Scalars := True;
end if;
Next (Item);
end loop;
end;
-- If a mapping file has been specified by a -gnatem switch, update
-- it if there has been some sources that were not in the mappings.
if Mapping_File_Name /= null then
Fmap.Update_Mapping_File (Mapping_File_Name.all);
end if;
return;
end Frontend;
|
reznikmm/matreshka | Ada | 4,425 | ads | ------------------------------------------------------------------------------
-- --
-- Matreshka Project --
-- --
-- Web Framework --
-- --
-- Runtime Library Component --
-- --
------------------------------------------------------------------------------
-- --
-- Copyright © 2014-2015, Vadim Godunko <[email protected]> --
-- All rights reserved. --
-- --
-- Redistribution and use in source and binary forms, with or without --
-- modification, are permitted provided that the following conditions --
-- are met: --
-- --
-- * Redistributions of source code must retain the above copyright --
-- notice, this list of conditions and the following disclaimer. --
-- --
-- * Redistributions in binary form must reproduce the above copyright --
-- notice, this list of conditions and the following disclaimer in the --
-- documentation and/or other materials provided with the distribution. --
-- --
-- * Neither the name of the Vadim Godunko, IE nor the names of its --
-- contributors may be used to endorse or promote products derived from --
-- this software without specific prior written permission. --
-- --
-- THIS SOFTWARE IS PROVIDED BY THE COPYRIGHT HOLDERS AND CONTRIBUTORS --
-- "AS IS" AND ANY EXPRESS OR IMPLIED WARRANTIES, INCLUDING, BUT NOT --
-- LIMITED TO, THE IMPLIED WARRANTIES OF MERCHANTABILITY AND FITNESS FOR --
-- A PARTICULAR PURPOSE ARE DISCLAIMED. IN NO EVENT SHALL THE COPYRIGHT --
-- HOLDER OR CONTRIBUTORS BE LIABLE FOR ANY DIRECT, INDIRECT, INCIDENTAL, --
-- SPECIAL, EXEMPLARY, OR CONSEQUENTIAL DAMAGES (INCLUDING, BUT NOT LIMITED --
-- TO, PROCUREMENT OF SUBSTITUTE GOODS OR SERVICES; LOSS OF USE, DATA, OR --
-- PROFITS; OR BUSINESS INTERRUPTION) HOWEVER CAUSED AND ON ANY THEORY OF --
-- LIABILITY, WHETHER IN CONTRACT, STRICT LIABILITY, OR TORT (INCLUDING --
-- NEGLIGENCE OR OTHERWISE) ARISING IN ANY WAY OUT OF THE USE OF THIS --
-- SOFTWARE, EVEN IF ADVISED OF THE POSSIBILITY OF SUCH DAMAGE. --
-- --
------------------------------------------------------------------------------
-- $Revision$ $Date$
------------------------------------------------------------------------------
-- Interface through which a Servlet may be further configured.
------------------------------------------------------------------------------
with League.String_Vectors;
with League.Strings;
package Servlet.Servlet_Registrations is
pragma Preelaborate;
type Servlet_Registration is limited interface;
not overriding function Add_Mapping
(Self : not null access Servlet_Registration;
URL_Patterns : League.String_Vectors.Universal_String_Vector)
return League.String_Vectors.Universal_String_Vector is abstract;
function Add_Mapping
(Self : not null access Servlet_Registration'Class;
URL_Pattern : League.Strings.Universal_String)
return League.String_Vectors.Universal_String_Vector;
procedure Add_Mapping
(Self : not null access Servlet_Registration'Class;
URL_Patterns : League.String_Vectors.Universal_String_Vector);
procedure Add_Mapping
(Self : not null access Servlet_Registration'Class;
URL_Pattern : League.Strings.Universal_String);
end Servlet.Servlet_Registrations;
|
ohenley/ada-util | Ada | 2,612 | adb | -----------------------------------------------------------------------
-- util-streams -- Stream utilities
-- Copyright (C) 2010, 2011, 2016, 2018 Stephane Carrez
-- Written by Stephane Carrez ([email protected])
--
-- Licensed under the Apache License, Version 2.0 (the "License");
-- you may not use this file except in compliance with the License.
-- You may obtain a copy of the License at
--
-- http://www.apache.org/licenses/LICENSE-2.0
--
-- Unless required by applicable law or agreed to in writing, software
-- distributed under the License is distributed on an "AS IS" BASIS,
-- WITHOUT WARRANTIES OR CONDITIONS OF ANY KIND, either express or implied.
-- See the License for the specific language governing permissions and
-- limitations under the License.
-----------------------------------------------------------------------
package body Util.Streams is
use Ada.Streams;
-- ------------------------------
-- Copy the input stream to the output stream until the end of the input stream
-- is reached.
-- ------------------------------
procedure Copy (From : in out Input_Stream'Class;
Into : in out Output_Stream'Class) is
Buffer : Stream_Element_Array (0 .. 4_096);
Last : Stream_Element_Offset;
begin
loop
From.Read (Buffer, Last);
if Last > Buffer'First then
Into.Write (Buffer (Buffer'First .. Last));
end if;
exit when Last < Buffer'Last;
end loop;
end Copy;
-- ------------------------------
-- Copy the stream array to the string.
-- The string must be large enough to hold the stream array
-- or a Constraint_Error exception is raised.
-- ------------------------------
procedure Copy (From : in Ada.Streams.Stream_Element_Array;
Into : in out String) is
Pos : Positive := Into'First;
begin
for I in From'Range loop
Into (Pos) := Character'Val (From (I));
Pos := Pos + 1;
end loop;
end Copy;
-- ------------------------------
-- Copy the string to the stream array.
-- The stream array must be large enough to hold the string
-- or a Constraint_Error exception is raised.
-- ------------------------------
procedure Copy (From : in String;
Into : in out Ada.Streams.Stream_Element_Array) is
Pos : Ada.Streams.Stream_Element_Offset := Into'First;
begin
for I in From'Range loop
Into (Pos) := Character'Pos (From (I));
Pos := Pos + 1;
end loop;
end Copy;
end Util.Streams;
|
reznikmm/matreshka | Ada | 4,664 | 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_Style.Legend_Expansion_Attributes is
------------
-- Create --
------------
overriding function Create
(Parameters : not null access Matreshka.DOM_Attributes.Attribute_L2_Parameters)
return Style_Legend_Expansion_Attribute_Node is
begin
return Self : Style_Legend_Expansion_Attribute_Node do
Matreshka.ODF_Style.Constructors.Initialize
(Self'Unchecked_Access,
Parameters.Document,
Matreshka.ODF_String_Constants.Style_Prefix);
end return;
end Create;
--------------------
-- Get_Local_Name --
--------------------
overriding function Get_Local_Name
(Self : not null access constant Style_Legend_Expansion_Attribute_Node)
return League.Strings.Universal_String
is
pragma Unreferenced (Self);
begin
return Matreshka.ODF_String_Constants.Legend_Expansion_Attribute;
end Get_Local_Name;
begin
Matreshka.DOM_Documents.Register_Attribute
(Matreshka.ODF_String_Constants.Style_URI,
Matreshka.ODF_String_Constants.Legend_Expansion_Attribute,
Style_Legend_Expansion_Attribute_Node'Tag);
end Matreshka.ODF_Style.Legend_Expansion_Attributes;
|
riccardo-bernardini/eugen | Ada | 8,700 | adb | with Tokenize.Private_Token_Lists;
package body Tokenize with SPARK_Mode => On is
use Private_Token_Lists;
function To_Array (List : Token_List) return Token_Array;
function Basic_Split (To_Be_Splitted : String;
Separator : Ada.Strings.Maps.Character_Set;
Max_Token_Count : Token_Limit;
Collate : Boolean)
return Token_List
with
Pre => To_Be_Splitted'Length > 0
and To_Be_Splitted'Last < Integer'Last - 1,
Annotate => (Gnatprove, Terminating);
-----------------
-- Basic_Split --
-----------------
function Basic_Split (To_Be_Splitted : String;
Separator : Ada.Strings.Maps.Character_Set;
Max_Token_Count : Token_Limit;
Collate : Boolean)
return Token_List is
use Ada.Strings.Maps;
pragma Assert (To_Be_Splitted'Length > 0);
Result : Token_List := Create (To_Be_Splitted'Length);
First : Integer;
begin
pragma Assert (Result.Capacity = To_Be_Splitted'Length);
pragma Assert (Result.Length = 0);
First := To_Be_Splitted'First;
for Pos in To_Be_Splitted'Range loop
pragma Assert (Pos >= First);
pragma Assert (Integer (Result.Length) <= Pos - To_Be_Splitted'First);
if Is_In (To_Be_Splitted (Pos), Separator) then
if First = Pos then
if not Collate then
Result.Append ("");
end if;
else
pragma Assert (First < Pos);
Result.Append (To_Be_Splitted (First .. Pos - 1));
end if;
First := Pos + 1;
if Max_Token_Count /= No_Limit and then
Result.Length = Max_Token_Count - 1
then
Result.Append (To_Be_Splitted (First .. To_Be_Splitted'Last));
return Result;
end if;
pragma Assert (Integer (Result.Length) <= Pos - To_Be_Splitted'First + 1);
end if;
end loop;
pragma Assert (if Max_Token_Count /= No_Limit then Result.Length < Max_Token_Count - 1);
if First = To_Be_Splitted'Last + 1 then
-- If I am here, to_be_splitted(to_be_splitted'last) is a separator
-- That is, the string ends with a terminator.
if not Collate then
Result.Append ("");
end if;
else
Result.Append (To_Be_Splitted (First .. To_Be_Splitted'Last));
end if;
return Result;
end Basic_Split;
--
-- function Collated_Split (To_Be_Splitted : String;
-- Separator : Ada.Strings.Maps.Character_Set;
-- Max_Token_Count : Token_Limit)
-- return Token_List
-- with Pre => Max_Token_Count /= No_Limit and To_Be_Splitted /= "",
-- Post => Collated_Split'Result.Length > 0;
--
-- --------------------
-- -- Collated_Split --
-- --------------------
--
-- function Collated_Split (To_Be_Splitted : String;
-- Separator : Ada.Strings.Maps.Character_Set;
-- Max_Token_Count : Token_Limit)
-- return Token_List is
-- Tokens : constant Token_List := Uncollated_Split (To_Be_Splitted, Separator);
-- Result : Token_List := Create (Tokens.Length);
-- begin
-- if Max_Token_Count /= No_Limit then
-- pragma Compile_Time_Warning (True, "Collated with limit unimplemented");
-- raise Program_Error with "Collated with limit unimplemented";
-- end if;
--
-- for K in 1 .. Tokens.Length loop
-- if Tokens.Element (K) /= "" then
-- Result.Append (Tokens.Element (K));
-- end if;
-- end loop;
--
-- return Result;
-- end Collated_Split;
function Split (To_Be_Splitted : String;
Separator : Ada.Strings.Maps.Character_Set;
Collate_Separator : Boolean;
Max_Token_Count : Token_Limit := No_Limit)
return Token_Array is
begin
if To_Be_Splitted = "" then
declare
Empty : constant Token_Array (1 .. 0) := (others => <>);
begin
return Empty;
end;
end if;
if Max_Token_Count = 1 then
-- Easy case
return (1 => To_Unbounded_String (To_Be_Splitted));
end if;
pragma Assert (To_Be_Splitted /= "");
return To_Array (Basic_Split (To_Be_Splitted => To_Be_Splitted,
Separator => Separator,
Max_Token_Count => Max_Token_Count,
Collate => Collate_Separator));
-- if (Collate_Separator) then
-- return To_Array (Basic_Split (To_Be_Splitted, Separator, Max_Token_Count, True));
-- else
-- return To_Array (Basic_Split (To_Be_Splitted, Separator, Max_Token_Count, False));
-- end if;
end Split;
-- -----------
-- -- Split --
-- -----------
--
-- function Split (To_Be_Splitted : String;
-- Separator : Character;
-- Collate_Separator : Boolean)
-- return Token_Array is
-- begin
-- return
-- end Split;
--------------
-- To_Array --
--------------
function To_Array (List : Token_List)
return Token_Array is
Result : Token_Array (1 .. List.Length);
begin
for I in Result'Range loop
Result (I) := To_Unbounded_String (List.Element (I));
end loop;
return Result;
end To_Array;
procedure Head_And_Tail (To_Be_Splitted : String;
Separator : Character;
Head : out Unbounded_String;
Tail : out Unbounded_String;
Trimming : Trimming_Action := Both;
Default_Tail : String := "")
is
function Trim (X : Unbounded_String) return Unbounded_String
is (case Trimming is
when None => X,
when Left => Trim (X, Ada.Strings.Left),
when Right => Trim (X, Ada.Strings.Right),
when Both => Trim (X, Ada.Strings.Both));
Pieces : constant Token_Array := Split (To_Be_Splitted => To_Be_Splitted,
Separator => Separator,
Max_Token_Count => 2);
begin
case Pieces'Length is
when 0 =>
raise Constraint_Error with "Empty input";
when 1 =>
Head := Trim (Pieces (Pieces'First));
Tail := To_Unbounded_String (Default_Tail);
when 2 =>
Head := Trim (Pieces (Pieces'First));
Tail := Trim (Pieces (Pieces'First + 1));
when others =>
-- If we arrive here, Split has a bug
raise Program_Error;
end case;
end Head_And_Tail;
end Tokenize;
-- Current := To_Be_Splitted'First;
--
-- Main_Loop:
-- while Current <= To_Be_Splitted'Last loop
--
-- Search_For_Begin:
-- -- Since we are doing a Collated split, we need to skip
-- -- all the separators
-- while Current <= To_Be_Splitted'Last and then
-- To_Be_Splitted(Current) = Separator loop
-- Current := Current+1;
-- end loop Search_For_Begin;
--
-- -- If I am here or Current points after the end of
-- -- the string of To_Be_Splitted(Current) is a non-sep
-- -- character
--
-- exit when (Current > To_Be_Splitted'Last);
--
-- -- If I am here, To_Be_Splitted(Current) is a
-- -- non-separator character
--
-- First := Current;
--
-- Search_For_End:
-- while Current <= To_Be_Splitted'Last and then
-- To_Be_Splitted(Current) /= Separator loop
-- Current := Current+1;
-- end loop Search_For_End;
--
-- String_Vectors.Append (Result,
-- To_Be_Splitted(First..Current-1));
--
-- Current := Current+1;
-- end loop Main_Loop;
|
srunr/Continued-Fractions | Ada | 10,119 | adb | with Ada.Text_IO;
with Ada.Real_Time; use Ada.Real_Time;
with Extended_Real;
with Extended_Real.IO;
procedure Contfrac5 is
type Real is digits 15;
Start_time, End_time : Time;
Exec_time : Time_Span;
generic
type Scalar is digits <>;
nr_of_digits : Integer;
with function A (N : in Natural) return Scalar;
with function B (N : in Positive) return Scalar;
with package Ext_Real is new Extended_Real(Scalar,nr_of_digits);
function Continued_Fraction (Steps : in Natural) return Ext_Real.e_Real;
function Continued_Fraction (Steps : in Natural) return Ext_Real.e_Real is
use Ext_Real;
function A (N : in Natural) return e_Real is (Make_Extended(A(N)));
function B (N : in Positive) return e_Real is (Make_Extended(B(N)));
Fraction : e_Real := Make_Extended(0.0);
begin
for N in reverse Natural range 1 .. Steps loop
Fraction := B(N) / (A(N) + Fraction);
end loop;
return A (0) + Fraction;
end Continued_Fraction;
generic
type Scalar is digits <>;
nr_of_digits : Integer;
with package Ext_Real is new Extended_Real(Scalar, nr_of_digits);
package Square_Root_Of_2 is
function A (N : in Natural) return Scalar is (Scalar((if N = 0 then 1 else 2)));
function B (N : in Positive) return Scalar is (Scalar(1));
function Estimate is new Continued_Fraction(Scalar, nr_of_digits, A, B, Ext_Real);
function e_Real_Value( str : in String) return Ext_Real.e_Real;
end Square_Root_Of_2;
package body Square_Root_Of_2 is
package Square_Root_Of_2_IO is new Ext_Real.IO;
function e_Real_Value( str : in String) return Ext_Real.e_Real is
rval : Ext_Real.e_Real := Ext_Real."+"(0);
Last : Natural := 0;
begin
Square_Root_Of_2_IO.e_Real_Val(str, rval, Last);
return rval;
end e_Real_Value;
end Square_Root_Of_2;
package Ext_Real_Square_Root_Of_2 is new Extended_Real(Real,30); use Ext_Real_Square_Root_Of_2;
package Ext_Real_Square_Root_Of_2_IO is new Ext_Real_Square_Root_Of_2.IO; use Ext_Real_Square_Root_Of_2_IO;
package Ext_Square_Root_Of_2 is new Square_Root_Of_2(Real, 30, Ext_Real_Square_Root_Of_2); use Ext_Square_Root_Of_2;
SquareRootOf2_30 : constant String := "1.41421356237309504880168872421";
-- source : https://www.wolframalpha.com/input/?i=sqr%282%29+30+digits
generic
type Scalar is digits <>;
nr_of_digits : Integer;
with package Ext_Real is new Extended_Real(Scalar, nr_of_digits);
package Napiers_Constant is
function A (N : in Natural) return Scalar is (Scalar(if N = 0 then 2 else N));
function B (N : in Positive) return Scalar is (Scalar(if N = 1 then 1 else N-1));
function Estimate is new Continued_Fraction(Scalar, nr_of_digits, A, B, Ext_Real);
function e_Real_Value( str : in String) return Ext_Real.e_Real;
end Napiers_Constant;
package body Napiers_Constant is
package Napiers_Constant_IO is new Ext_Real.IO;
function e_Real_Value( str : in String) return Ext_Real.e_Real is
rval : Ext_Real.e_Real := Ext_Real."+"(0);
Last : Natural := 0;
begin
Napiers_Constant_IO.e_Real_Val(str, rval, Last);
return rval;
end e_Real_Value;
end Napiers_Constant;
package Ext_Real_Napiers_Constant is new Extended_Real(Real, 60); use Ext_Real_Napiers_Constant;
package Ext_Real_Napiers_Constant_IO is new Ext_Real_Napiers_Constant.IO; use Ext_Real_Napiers_Constant_IO;
package Ext_Napiers_Constant is new Napiers_Constant(Real, 60, Ext_Real_Napiers_Constant); use Ext_Napiers_Constant;
NapiersConstant60 : constant String := "2.71828182845904523536028747135266249775724709369995957496697";
-- source : https://www.wolframalpha.com/input/?i=exp%281%29+60+digits
generic
type Scalar is digits <>;
ddd : Integer;
with package Ext_Real is new Extended_Real(Scalar,ddd);
package Pi is
function A (N : in Natural) return Scalar is (Scalar(if N = 0 then 3 else 6));
function B (N : in Positive) return Scalar is (Scalar(((2 * N - 1) ** 2)));
function Estimate is new Continued_Fraction(Scalar, ddd, A, B, Ext_Real);
function e_Real_Value( str : in String) return Ext_Real.e_Real;
end Pi;
package body Pi is
package Pi_IO is new Ext_Real.IO;
function e_Real_Value( str : in String) return Ext_Real.e_Real is
rval : Ext_Real.e_Real := Ext_Real."+"(0);
Last : Natural := 0;
begin
Pi_IO.e_Real_Val(str, rval, Last);
return rval;
end e_Real_Value;
end Pi;
package Ext_Real_Pi is new Extended_Real(Real,90); use Ext_Real_Pi;
package Ext_Real_Pi_IO is new Ext_Real_Pi.IO; use Ext_Real_Pi_IO;
package Ext_Pi is new Pi(Real, 90, Ext_Real_Pi);
generic
type Scalar is digits <>;
ddd : Integer;
with package Ext_Real is new Extended_Real(Scalar,ddd);
package Pi2 is -- See https://en.wikipedia.org/wiki/Generalized_continued_fraction
function A (N : in Natural) return Scalar is (Scalar((if N = 0 then 0 else 2 * N - 1)));
function B (N : in Positive) return Scalar is (Scalar(if N = 0 then 0 else (if N = 1 then 4 else (N - 1)**2)));
function Estimate is new Continued_Fraction(Scalar, ddd, A, B, Ext_Real);
function e_Real_Value( str : in String) return Ext_Real.e_Real;
end Pi2;
package body Pi2 is
package Pi_IO is new Ext_Real.IO;
function e_Real_Value( str : in String) return Ext_Real.e_Real is
rval : Ext_Real.e_Real := Ext_Real."+"(0);
Last : Natural := 0;
begin
Pi_IO.e_Real_Val(str, rval, Last);
return rval;
end e_Real_Value;
end Pi2;
package Ext_Real_Pi2 is new Extended_Real(Real,90); use Ext_Real_Pi2;
package Ext_Real_Pi_IO2 is new Ext_Real_Pi2.IO; use Ext_Real_Pi_IO2;
package Ext_Pi2 is new Pi2(Real, 90, Ext_Real_Pi);
Pi90 : constant String := "3.14159265358979323846264338327950288419716939937510582097494459230781640628620899862803483";
-- source : https://www.wolframalpha.com/input/?i=N%5BPi%2C+90%5D
generic
type Scalar is digits <>;
ddd : Integer;
with package Ext_Real is new Extended_Real(Scalar,ddd);
package Golden_Ratio is
function A (N : in Natural) return Scalar is (Scalar(1));
function B (N : in Positive) return Scalar is (Scalar(1));
function Estimate is new Continued_Fraction(Scalar, ddd, A, B, Ext_Real);
function e_Real_Value(str : In String) return Ext_Real.e_Real;
end Golden_Ratio;
package body Golden_Ratio is
package Golden_Ratio_IO is new Ext_Real.IO;
function e_Real_Value( str : in String) return Ext_Real.e_Real is
rval : Ext_Real.e_Real := Ext_Real."+"(0);
Last : Natural := 0;
begin
Golden_Ratio_IO.e_Real_Val(str, rval, Last);
return rval;
end e_Real_Value;
end Golden_Ratio;
package Ext_Real_Golden_Ratio is new Extended_Real(Real,50); use Ext_Real_Golden_Ratio;
package Ext_Real_Golden_Ratio_IO is new Ext_Real_Golden_Ratio.IO; use Ext_Real_Golden_Ratio_IO;
package Ext_Golden_Ratio is new Golden_Ratio(Real, 50, Ext_Real_Golden_Ratio);
GoldenRatio50 : constant String := "1.6180339887498948482045868343656381177203091798058";
-- source: https://www.wolframalpha.com/input/?i=N%5BGoldenRatio%2C+50%5D
use Ada.Text_IO;
begin -- Contfrac
Put("Square_Root_Of_2(digits: " & Ext_Real_Square_Root_Of_2.Desired_Decimal_Digit_Precision'Image & ") = ");
Start_time := clock;
Put(e_Real_Image(Ext_Square_Root_Of_2.Estimate (200)));
End_time := clock;
Exec_Time := End_Time - Start_Time;
Put_Line(" Execution time : " & Duration'Image (To_Duration(Exec_Time)) & " seconds ");
Put_line("SquareRootOf2 constant = " & SquareRootOf2_30);
Put_Line("SquareRootOf2_30error : " & e_Real_Image(Ext_Square_Root_Of_2.Estimate(10000) - Ext_Square_Root_Of_2.e_Real_Value(SquareRootOf2_30)));
new_line;
Put("Napiers_Constant(digits: " & Ext_Real_Napiers_Constant.Desired_Decimal_Digit_Precision'Image & ") = ");
Start_time := clock;
Put (e_Real_Image(Ext_Napiers_Constant.Estimate (200)));
End_time := clock;
Exec_Time := End_Time - Start_Time;
Put_Line (" Execution time : " & Duration'Image (To_Duration(Exec_Time)) & " seconds ");
Put_line("NapiersConstant constant = " & NapiersConstant60);
Put_Line("NapiersConstant60error : " & e_Real_Image(Ext_Napiers_Constant.Estimate(10000) - Ext_Napiers_Constant.e_Real_Value(NapiersConstant60)));
new_line;
Put("Pi(digits: " & Ext_Real_Pi.Desired_Decimal_Digit_Precision'Image & ") = ");
Start_time := clock;
Put (e_Real_Image(Ext_Pi.Estimate (10000)));
End_time := clock;
Exec_Time := End_Time - Start_Time;
Put_Line (" Execution time : " & Duration'Image (To_Duration(Exec_Time)) & " seconds ");
Put_line("Pi constant = " & Pi90);
Put_Line("Pi90error : " & e_Real_Image(Ext_Pi.Estimate(10000) - Ext_Pi.e_Real_Value(Pi90)));
new_line;
Put("Pi2(digits: " & Ext_Real_Pi2.Desired_Decimal_Digit_Precision'Image & ") = ");
Start_time := clock;
Put (e_Real_Image(Ext_Pi2.Estimate (10000)));
End_time := clock;
Exec_Time := End_Time - Start_Time;
Put_Line (" Execution time : " & Duration'Image (To_Duration(Exec_Time)) & " seconds ");
Put_line("Pi constant = " & Pi90);
Put_Line("Pi290error : " & e_Real_Image(Ext_Pi2.Estimate(10000) - Ext_Pi2.e_Real_Value(Pi90)));
new_line;
Put("Golden_Ratio(digits: " & Ext_Real_Golden_Ratio.Desired_Decimal_Digit_Precision'Image & ") = ");
Start_time := clock;
Put (e_Real_Image(Ext_Golden_Ratio.Estimate (20000)));
End_time := clock;
Exec_Time := End_Time - Start_Time;
Put_Line (" Execution time : " & Duration'Image (To_Duration(Exec_Time)) & " seconds ");
Put_line("Golden_Ratio constant = " & GoldenRatio50);
Put_Line("GoldenRatio50error : " & e_Real_Image(Ext_Golden_Ratio.Estimate (20000) - Ext_Golden_Ratio.e_Real_Value(GoldenRatio50)));
end Contfrac5;
|
zhmu/ananas | Ada | 8,013 | ads | ------------------------------------------------------------------------------
-- --
-- GNAT RUN-TIME COMPONENTS --
-- --
-- S Y S T E M --
-- --
-- S p e c --
-- (VxWorks 6.x SMP PPC RTP) --
-- --
-- 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. --
-- --
------------------------------------------------------------------------------
-- This is the VxWorks SMP version of this package for RTPs
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 := 1.0 / 60.0;
-- Storage-related Declarations
type Address is private;
pragma Preelaborable_Initialization (Address);
Null_Address : constant Address;
Storage_Unit : constant := 8;
Word_Size : constant := 32;
Memory_Size : constant := 2 ** 32;
-- Address comparison
function "<" (Left, Right : Address) return Boolean;
function "<=" (Left, Right : Address) return Boolean;
function ">" (Left, Right : Address) return Boolean;
function ">=" (Left, Right : Address) return Boolean;
function "=" (Left, Right : Address) return Boolean;
pragma Import (Intrinsic, "<");
pragma Import (Intrinsic, "<=");
pragma Import (Intrinsic, ">");
pragma Import (Intrinsic, ">=");
pragma Import (Intrinsic, "=");
-- Other System-Dependent Declarations
type Bit_Order is (High_Order_First, Low_Order_First);
Default_Bit_Order : constant Bit_Order := High_Order_First;
pragma Warnings (Off, Default_Bit_Order); -- kill constant condition warning
-- Priority-related Declarations (RM D.1)
-- Ada priorities are mapped to VxWorks priorities using the following
-- transformation: 255 - Ada Priority
-- Ada priorities are used as follows:
-- 256 is reserved for the VxWorks kernel
-- 248 - 255 correspond to hardware interrupt levels 0 .. 7
-- 247 is a catchall default "interrupt" priority for signals,
-- allowing higher priority than normal tasks, but lower than
-- hardware priority levels. Protected Object ceilings can
-- override these values.
-- 246 is used by the Interrupt_Manager task
Max_Priority : constant Positive := 245;
Max_Interrupt_Priority : constant Positive := 255;
subtype Any_Priority is Integer range 0 .. 255;
subtype Priority is Any_Priority range 0 .. 245;
subtype Interrupt_Priority is Any_Priority range 246 .. 255;
Default_Priority : constant Priority := 122;
private
pragma Linker_Options ("--specs=vxworks-smp-ppc-link.spec");
pragma Linker_Options ("--specs=vxworks-ppc-link.spec");
-- Setup proper set of -L's for this configuration
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;
Executable_Extension : constant String := ".vxe";
end System;
|
reznikmm/matreshka | Ada | 12,574 | adb | ------------------------------------------------------------------------------
-- --
-- Matreshka Project --
-- --
-- Web Framework --
-- --
-- Runtime Library Component --
-- --
------------------------------------------------------------------------------
-- --
-- Copyright © 2015, Vadim Godunko <[email protected]> --
-- All rights reserved. --
-- --
-- Redistribution and use in source and binary forms, with or without --
-- modification, are permitted provided that the following conditions --
-- are met: --
-- --
-- * Redistributions of source code must retain the above copyright --
-- notice, this list of conditions and the following disclaimer. --
-- --
-- * Redistributions in binary form must reproduce the above copyright --
-- notice, this list of conditions and the following disclaimer in the --
-- documentation and/or other materials provided with the distribution. --
-- --
-- * Neither the name of the Vadim Godunko, IE nor the names of its --
-- contributors may be used to endorse or promote products derived from --
-- this software without specific prior written permission. --
-- --
-- THIS SOFTWARE IS PROVIDED BY THE COPYRIGHT HOLDERS AND CONTRIBUTORS --
-- "AS IS" AND ANY EXPRESS OR IMPLIED WARRANTIES, INCLUDING, BUT NOT --
-- LIMITED TO, THE IMPLIED WARRANTIES OF MERCHANTABILITY AND FITNESS FOR --
-- A PARTICULAR PURPOSE ARE DISCLAIMED. IN NO EVENT SHALL THE COPYRIGHT --
-- HOLDER OR CONTRIBUTORS BE LIABLE FOR ANY DIRECT, INDIRECT, INCIDENTAL, --
-- SPECIAL, EXEMPLARY, OR CONSEQUENTIAL DAMAGES (INCLUDING, BUT NOT LIMITED --
-- TO, PROCUREMENT OF SUBSTITUTE GOODS OR SERVICES; LOSS OF USE, DATA, OR --
-- PROFITS; OR BUSINESS INTERRUPTION) HOWEVER CAUSED AND ON ANY THEORY OF --
-- LIABILITY, WHETHER IN CONTRACT, STRICT LIABILITY, OR TORT (INCLUDING --
-- NEGLIGENCE OR OTHERWISE) ARISING IN ANY WAY OUT OF THE USE OF THIS --
-- SOFTWARE, EVEN IF ADVISED OF THE POSSIBILITY OF SUCH DAMAGE. --
-- --
------------------------------------------------------------------------------
-- $Revision$ $Date$
------------------------------------------------------------------------------
with League.Holders.Generic_Integers;
with SQL.Queries;
with OPM.Engines;
with AWFC.Accounts.Users.User_Identifier_Holders;
package body AWFC.Accounts.Users.Stores is
type Pool_User_Access is access all User'Class;
-- Internal type to allocate and deallocate instances of User object.
function "+"
(Item : Wide_Wide_String) return League.Strings.Universal_String
renames League.Strings.To_Universal_String;
type Boolean_Integer is range 0 .. 1;
package Boolean_Integer_Holders is
new League.Holders.Generic_Integers (Boolean_Integer);
function To_Boolean_Integer_Holder
(Value : Boolean) return League.Holders.Holder;
function From_Boolean_Integer_Holder
(Value : League.Holders.Holder) return Boolean;
------------
-- Create --
------------
function Create
(Self : not null access User_Store'Class;
Email : League.Strings.Universal_String)
return not null AWFC.Accounts.Users.User_Access
is
Insert_Query : SQL.Queries.SQL_Query := Self.Engine.Get_Database.Query;
Select_Query : SQL.Queries.SQL_Query := Self.Engine.Get_Database.Query;
begin
Insert_Query.Prepare
(+("INSERT INTO users (enabled, email)"
& " VALUES (:enabled, :email)"));
Insert_Query.Bind_Value (+":email", League.Holders.To_Holder (Email));
Insert_Query.Bind_Value (+":enabled", To_Boolean_Integer_Holder (False));
Insert_Query.Execute;
Select_Query.Prepare
(+("SELECT user_identifier, email, enabled"
& " FROM users"
& " WHERE email = :email"));
Select_Query.Bind_Value (+":email", League.Holders.To_Holder (Email));
Select_Query.Execute;
if not Select_Query.Next then
raise Program_Error;
end if;
Self.Identifier :=
AWFC.Accounts.Users.User_Identifier_Holders.Element
(Select_Query.Value (1));
Self.Email := League.Holders.Element (Select_Query.Value (2));
Self.Enabled := From_Boolean_Integer_Holder (Select_Query.Value (3));
return Result : constant not null AWFC.Accounts.Users.User_Access
:= AWFC.Accounts.Users.User_Access
(Pool_User_Access'
(new Non_Anonymous_User_Type'
(AWFC.Accounts.Users.Initialize (Self))))
do
Self.Email_Cache.Insert (Self.Get_Email, Result);
Self.Identifier_Cache.Insert (Self.Get_User_Identifier, Result);
end return;
end Create;
---------------------------------
-- From_Boolean_Integer_Holder --
---------------------------------
function From_Boolean_Integer_Holder
(Value : League.Holders.Holder) return Boolean
is
-- Why postgresql binding for boolean accepts integer, but return str?
Image : constant League.Strings.Universal_String :=
League.Holders.Element (Value);
begin
return Image.To_Wide_Wide_String = "t";
end From_Boolean_Integer_Holder;
------------------------
-- Get_Anonymous_User --
------------------------
overriding function Get_Anonymous_User
(Self : in out User_Store)
return not null AWFC.Accounts.Users.User_Access is
begin
return
Self.Identifier_Cache (AWFC.Accounts.Users.Anonymous_User_Identifier);
end Get_Anonymous_User;
---------------
-- Get_Email --
---------------
not overriding function Get_Email
(Self : not null access User_Store)
return League.Strings.Universal_String is
begin
return Self.Email;
end Get_Email;
-----------------
-- Get_Enabled --
-----------------
function Get_Enabled
(Self : not null access User_Store'Class) return Boolean is
begin
return Self.Enabled;
end Get_Enabled;
-------------------------
-- Get_User_Identifier --
-------------------------
function Get_User_Identifier
(Self : not null access User_Store'Class)
return AWFC.Accounts.Users.User_Identifier is
begin
return Self.Identifier;
end Get_User_Identifier;
---------------
-- Incarnate --
---------------
function Incarnate
(Self : not null access User_Store'Class;
Email : League.Strings.Universal_String)
return AWFC.Accounts.Users.User_Access
is
Position : constant Email_Mappings.Cursor
:= Self.Email_Cache.Find (Email);
begin
if Email_Mappings.Has_Element (Position) then
return Email_Mappings.Element (Position);
end if;
declare
Select_Query : SQL.Queries.SQL_Query
:= Self.Engine.Get_Database.Query;
begin
Select_Query.Prepare
(+("SELECT user_identifier, email, enabled"
& " FROM users"
& " WHERE email = :email"));
Select_Query.Bind_Value (+":email", League.Holders.To_Holder (Email));
Select_Query.Execute;
if not Select_Query.Next then
return null;
end if;
Self.Identifier :=
AWFC.Accounts.Users.User_Identifier_Holders.Element
(Select_Query.Value (1));
Self.Email := League.Holders.Element (Select_Query.Value (2));
Self.Enabled :=
From_Boolean_Integer_Holder (Select_Query.Value (3));
return Result : constant AWFC.Accounts.Users.User_Access
:= AWFC.Accounts.Users.User_Access
(Pool_User_Access'
(new Non_Anonymous_User_Type'
(AWFC.Accounts.Users.Initialize (Self))))
do
Self.Email_Cache.Insert (Self.Get_Email, Result);
Self.Identifier_Cache.Insert (Self.Get_User_Identifier, Result);
end return;
end;
end Incarnate;
---------------
-- Incarnate --
---------------
function Incarnate
(Self : not null access User_Store'Class;
Identifier : AWFC.Accounts.Users.User_Identifier)
return AWFC.Accounts.Users.User_Access
is
Position : constant Identifier_Mappings.Cursor
:= Self.Identifier_Cache.Find (Identifier);
begin
if Identifier_Mappings.Has_Element (Position) then
return Identifier_Mappings.Element (Position);
end if;
declare
Select_Query : SQL.Queries.SQL_Query
:= Self.Engine.Get_Database.Query;
begin
Select_Query.Prepare
(+("SELECT user_identifier, email, enabled"
& " FROM users"
& " WHERE user_identifier = :user_identifier"));
Select_Query.Bind_Value
(+":user_identifier",
AWFC.Accounts.Users.User_Identifier_Holders.To_Holder (Identifier));
Select_Query.Execute;
if not Select_Query.Next then
return null;
end if;
Self.Identifier :=
AWFC.Accounts.Users.User_Identifier_Holders.Element
(Select_Query.Value (1));
Self.Email := League.Holders.Element (Select_Query.Value (2));
Self.Enabled :=
From_Boolean_Integer_Holder (Select_Query.Value (3));
return Result : constant AWFC.Accounts.Users.User_Access
:= AWFC.Accounts.Users.User_Access
(Pool_User_Access'
(new Non_Anonymous_User_Type'
(AWFC.Accounts.Users.Initialize (Self))))
do
Self.Email_Cache.Insert (Self.Email, Result);
Self.Identifier_Cache.Insert (Self.Get_User_Identifier, Result);
end return;
end;
end Incarnate;
----------------
-- Initialize --
----------------
overriding procedure Initialize (Self : in out User_Store) is
begin
Self.Identifier_Cache.Insert
(AWFC.Accounts.Users.Anonymous_User_Identifier,
new AWFC.Accounts.Users.Anonymous_User_Type);
Self.Engine.Register_Factory
(AWFC.Accounts.Users.User'Tag, Self'Unchecked_Access);
Self.Engine.Register_Store
(AWFC.Accounts.Users.User'Tag, Self'Unchecked_Access);
end Initialize;
-------------------------------
-- To_Boolean_Integer_Holder --
-------------------------------
function To_Boolean_Integer_Holder
(Value : Boolean) return League.Holders.Holder is
begin
case Value is
when False =>
return Boolean_Integer_Holders.To_Holder (0);
when True =>
return Boolean_Integer_Holders.To_Holder (1);
end case;
end To_Boolean_Integer_Holder;
--------------------
-- Update_Enabled --
--------------------
procedure Update_Enabled
(Self : not null access User_Store'Class;
User : not null access constant AWFC.Accounts.Users.User'Class)
is
Query : SQL.Queries.SQL_Query := Self.Engine.Get_Database.Query;
begin
Query.Prepare
(+("UPDATE users SET enabled = :enabled"
& " WHERE user_identifier = :user_identifier"));
Query.Bind_Value
(+":user_identifier",
AWFC.Accounts.Users.User_Identifier_Holders.To_Holder
(User.Get_User_Identifier));
Query.Bind_Value
(+":enabled", To_Boolean_Integer_Holder (User.Is_Enabled));
Query.Execute;
Self.Engine.Get_Database.Commit;
end Update_Enabled;
end AWFC.Accounts.Users.Stores;
|
stcarrez/ada-security | Ada | 5,182 | ads | -----------------------------------------------------------------------
-- security-oauth -- OAuth Security
-- Copyright (C) 2012, 2016, 2017, 2018, 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.Strings.Unbounded;
-- = OAuth =
-- The <b>Security.OAuth</b> package defines and implements the OAuth 2.0 authorization
-- framework as defined by the IETF working group in RFC 6749:
-- The OAuth 2.0 Authorization Framework.
--
-- @include security-oauth-clients.ads
-- @include security-oauth-servers.ads
package Security.OAuth is
-- OAuth 2.0: Section 10.2.2. Initial Registry Contents
-- RFC 6749: 11.2.2. Initial Registry Contents
CLIENT_ID : constant String := "client_id";
CLIENT_SECRET : constant String := "client_secret";
RESPONSE_TYPE : constant String := "response_type";
REDIRECT_URI : constant String := "redirect_uri";
SCOPE : constant String := "scope";
STATE : constant String := "state";
CODE : constant String := "code";
ERROR_DESCRIPTION : constant String := "error_description";
ERROR_URI : constant String := "error_uri";
GRANT_TYPE : constant String := "grant_type";
ACCESS_TOKEN : constant String := "access_token";
TOKEN_TYPE : constant String := "token_type";
EXPIRES_IN : constant String := "expires_in";
USERNAME : constant String := "username";
PASSWORD : constant String := "password";
REFRESH_TOKEN : constant String := "refresh_token";
NONCE_TOKEN : constant String := "nonce";
-- RFC 6749: 5.2. Error Response
INVALID_REQUEST : aliased constant String := "invalid_request";
INVALID_CLIENT : aliased constant String := "invalid_client";
INVALID_GRANT : aliased constant String := "invalid_grant";
UNAUTHORIZED_CLIENT : aliased constant String := "unauthorized_client";
UNSUPPORTED_GRANT_TYPE : aliased constant String := "unsupported_grant_type";
INVALID_SCOPE : aliased constant String := "invalid_scope";
-- RFC 6749: 4.1.2.1. Error Response
ACCESS_DENIED : aliased constant String := "access_denied";
UNSUPPORTED_RESPONSE_TYPE : aliased constant String := "unsupported_response_type";
SERVER_ERROR : aliased constant String := "server_error";
TEMPORARILY_UNAVAILABLE : aliased constant String := "temporarily_unavailable";
type Client_Authentication_Type is (AUTH_NONE, AUTH_BASIC);
-- ------------------------------
-- Application
-- ------------------------------
-- The <b>Application</b> holds the necessary information to let a user
-- grant access to its protected resources on the resource server. It contains
-- information that allows the OAuth authorization server to identify the
-- application (client id and secret key).
type Application is tagged private;
-- Get the application identifier.
function Get_Application_Identifier (App : in Application) return String;
-- Set the application identifier used by the OAuth authorization server
-- to identify the application (for example, the App ID in Facebook).
procedure Set_Application_Identifier (App : in out Application;
Client : in String);
-- Set the application secret defined in the OAuth authorization server
-- for the application (for example, the App Secret in Facebook).
procedure Set_Application_Secret (App : in out Application;
Secret : in String);
-- Set the redirection callback that will be used to redirect the user
-- back to the application after the OAuth authorization is finished.
procedure Set_Application_Callback (App : in out Application;
URI : in String);
-- Set the client authentication method used when doing OAuth calls for this application.
-- See RFC 6749, 2.3. Client Authentication
procedure Set_Client_Authentication (App : in out Application;
Method : in Client_Authentication_Type);
private
type Application is tagged record
Client_Id : Ada.Strings.Unbounded.Unbounded_String;
Secret : Ada.Strings.Unbounded.Unbounded_String;
Callback : Ada.Strings.Unbounded.Unbounded_String;
Client_Auth : Client_Authentication_Type := AUTH_NONE;
end record;
end Security.OAuth;
|
BrickBot/Bound-T-H8-300 | Ada | 13,539 | adb | -- Flow.Origins.Of_Condition_Flags (body)
--
-- A component of the Bound-T Worst-Case Execution Time Tool.
--
-------------------------------------------------------------------------------
-- Copyright (c) 1999 .. 2015 Tidorum Ltd
-- All rights reserved.
--
-- Redistribution and use in source and binary forms, with or without
-- modification, are permitted provided that the following conditions are met:
--
-- 1. Redistributions of source code must retain the above copyright notice, this
-- list of conditions and the following disclaimer.
-- 2. Redistributions in binary form must reproduce the above copyright notice,
-- this list of conditions and the following disclaimer in the documentation
-- and/or other materials provided with the distribution.
--
-- This software is provided by the copyright holders and contributors "as is" and
-- any express or implied warranties, including, but not limited to, the implied
-- warranties of merchantability and fitness for a particular purpose are
-- disclaimed. In no event shall the copyright owner or contributors be liable for
-- any direct, indirect, incidental, special, exemplary, or consequential damages
-- (including, but not limited to, procurement of substitute goods or services;
-- loss of use, data, or profits; or business interruption) however caused and
-- on any theory of liability, whether in contract, strict liability, or tort
-- (including negligence or otherwise) arising in any way out of the use of this
-- software, even if advised of the possibility of such damage.
--
-- Other modules (files) of this software composition should contain their
-- own copyright statements, which may have different copyright and usage
-- conditions. The above conditions apply to this file.
-------------------------------------------------------------------------------
--
-- $Revision: 1.3 $
-- $Date: 2015/10/24 20:05:48 $
--
-- $Log: flow-origins-of_condition_flags.adb,v $
-- Revision 1.3 2015/10/24 20:05:48 niklas
-- Moved to free licence.
--
-- Revision 1.2 2014/06/01 10:31:03 niklas
-- Tracing output depends on Opt.Trace_Flag_Origins.
--
-- Revision 1.1 2013/12/08 22:05:57 niklas
-- BT-CH-0259: Storing value-origin analysis results in execution bounds.
--
with Arithmetic;
with Arithmetic.Logic;
with Flow.Computation;
with Flow.Origins.Opt;
with Flow.Show;
with Output;
package body Flow.Origins.Of_Condition_Flags is
function Original_Comparison (
Flag : Bit_Cell_Ref;
After : Flow.Step_T;
Map : Map_Ref)
return Arithmetic.Expr_Ref
is
use Arithmetic;
use type Arithmetic.Width_T;
Result : Expr_Ref := Flag;
-- The result, by default the same as the Flag.
Origin : Origin_T;
-- The origin of the Flag's value.
Effect : Effect_Ref;
-- The effect that defines the value of the Flag, if the Origin
-- is an assignment (which is then part of this effect).
Assignment : Assignment_T;
-- The assignment that defines the value of the Flag,
-- if the Origin is an assignment.
Flag_Cond : Condition_T := Unknown;
-- The condition that defines the value of the Flag,
-- extracted from the Assignment. "Unknown" if the form
-- of the Assignment does not define such an expression.
begin
if Flag.Kind /= Arithmetic.Cell
or Flag.Width /= 1
then
Output.Fault (
Location => "Flow.Origins.Of_Condition_Flags.Original_Comparison",
Text =>
"Not a 1-bit cell"
& Output.Field_Separator
& Image (Flag));
elsif not Origin_Is_Known (Flag.Cell, Map) then
if Opt.Trace_Flag_Origins then
Output.Trace (
"Origin of flag "
& Storage.Image (Flag.Cell)
& " is not known.");
end if;
else
-- The Flag is a 1-bit cell with a known origin.
-- We look at the origin and try to interpret it
-- as a numerical comparison.
Origin := Origin_After (
Step => After,
Cell => Flag.Cell,
From => Map);
case Origin.Kind is
when Initial =>
-- Nothing we can do.
null;
when Merged =>
if Opt.Trace_Flag_Origins then
Output.Trace (
"Origin of flag "
& Storage.Image (Flag.Cell)
& " is merged"
& Output.Field_Separator
& Image (Origin));
end if;
when Assigned =>
Effect := Flow.Computation.Effect (
Step => Origin.Step,
Under => Origins.Computation (Map).all);
Assignment := Definition_Of (
Target => Origin.Cell,
Within => Effect.all);
case Assignment.Kind is
when Regular =>
-- Ah, at last we know the expression that
-- gives the flag its value.
Flag_Cond := Assignment.Value;
when Conditional =>
-- Perhaps this conditional assignment encodes a
-- condition in the form "if Cond then 1 else 0".
Arithmetic.Logic.Decode_Boolean_Bit (
Ass => Assignment,
Value => Flag_Cond);
if Flag_Cond = Unknown then
-- Nope.
if Opt.Trace_Flag_Origins then
Output.Trace (
"Origin of flag is conditional"
& Output.Field_Separator
& Image (Assignment));
end if;
end if;
when others =>
-- We don't know what to do...
if Opt.Trace_Flag_Origins then
Output.Trace (
"Origin of flag is curious"
& Output.Field_Separator
& Image (Assignment));
end if;
end case;
if Flag_Cond /= Unknown then
-- We have a candidate expression for the
-- value of the Flag. However, we must check
-- that the expression has the same value at
-- the assignment and use of the Flag.
if Has_Same_Value (
After => After,
Before => Origin.Step,
Expr => Flag_Cond,
From => Map)
then
-- Yes, we can use the defining condition directly
-- in place of the Flag.
Result := Flag_Cond;
elsif Opt.Trace_Flag_Origins then
Output.Trace (
"Origin of flag (at step"
& Step_Index_T'Image (Index (Origin.Step))
& ") is unstable"
& Output.Field_Separator
& Image (Flag_Cond));
end if;
end if;
end case;
end if;
return Result;
end Original_Comparison;
function With_Flags_Integrated (
Condition : Arithmetic.Condition_T;
After : Flow.Step_T;
Map : Map_Ref)
return Arithmetic.Condition_T
is
use Arithmetic;
use type Arithmetic.Width_T;
Model : Flow.Computation.Model_Handle_T := Computation (Map);
-- The underlying computation model.
procedure Integrate_Flags (
From : in Condition_T;
Into : out Condition_T)
--
-- Integrates uses of condition flags Into an expression which is
-- modified From the given expression. This is the recursive core
-- of the expression transformer.
--
is
Left, Right, Third : Expr_Ref;
-- The one, two, or three operands of the From expression
-- after being subjected to Integrate_Flags.
begin
Into := From;
-- Default. May be changed below.
case From.Kind is
when Opaque | Const | Ref =>
-- Nothing we can do.
null;
-- Meaning Into = From.
when Cell =>
if From.Width = 1 then
-- Perhaps a condition flag.
Into := Original_Comparison (From, After, Map);
end if;
when Unary_Kind =>
-- TBC: recurse only for TBA
Integrate_Flags (
From => From.Expr,
Into => Left);
if Left /= From.Expr then
-- Some change.
Into := Unary (
Operation => From.Unary,
Operand => Left,
Width => From.Width);
end if;
when Binary_Kind =>
-- TBC: recurse only for logical and, or.
-- TBC: i.e. only of the operand are also 1-bit values ?
Integrate_Flags (From => From.L_Expr, Into => Left);
Integrate_Flags (From => From.R_Expr, Into => Right);
if Left /= From.L_Expr
or Right /= From.R_Expr
then
-- Some change.
Into := Binary (
Operation => From.Binary,
Left => Left,
Right => Right,
Width => From.Width);
end if;
when Ternary_Kind =>
Integrate_Flags (From => From.L3_Expr, Into => Left);
Integrate_Flags (From => From.R3_Expr, Into => Right);
Integrate_Flags (From => From.C3_Expr, Into => Third);
if Left /= From.L3_Expr
or Right /= From.R3_Expr
or Third /= From.C3_Expr
then
-- Some change.
Into := Ternary (
Operation => From.Ternary,
Left => Left,
Right => Right,
Carry => Third,
Width => From.Width);
end if;
end case;
end Integrate_Flags;
Result : Arithmetic.Condition_T;
-- The result, with flags integrated if possible.
begin -- With_Flags_Integrated
Integrate_Flags (From => Condition, Into => Result);
return Result;
end With_Flags_Integrated;
procedure Integrate_In_Edge_Conditions (
Within : in out Flow.Computation.Model_Ref;
Using : in Map_Ref)
is
use type Arithmetic.Expr_Ref;
Graph : Graph_T := Flow.Computation.Graph (Under => Within);
-- The flow-graph of the subprogram in question.
Conditions_Changed : Natural := 0;
-- The number of edge conditions changed.
Step : Step_T;
-- The source of the edge under work.
Edge : Step_Edge_T;
-- The edge under work.
Step_Mark : Output.Nest_Mark_T;
-- The locus of the Step.
begin -- Integrate_In_Edge_Conditions
if Opt.Trace_Flag_Origins then
Output.Trace (
Locus => Flow.Show.Locus (Graph, Symbol_Table (Using)),
Text => "Integrating flags into edge conditions.");
end if;
for S in 1 .. Max_Step (Graph) loop
Step := Step_At (Index => S, Within => Graph);
Step_Mark := Output.Nest (Flow.Show.Locus (
Step => Step,
Source => Symbol_Table (Using)));
declare
Edges : constant Step_Edge_List_T :=
Flow.Computation.Edges_From (Step => Step, Under => Within);
-- The edges departing this Step.
Orig_Cond, New_Cond : Arithmetic.Condition_T;
-- The original and the possibly updated condition of the Edge.
begin
for E in Edges'Range loop
Edge := Edges(E);
Orig_Cond := Flow.Computation.Condition (Edge, Within);
New_Cond := With_Flags_Integrated (
Condition => Orig_Cond,
After => Step,
Map => Using);
if New_Cond /= Orig_Cond then
if Opt.Trace_Flag_Origins then
Output.Trace (
"Integrated flags into condition for edge"
& Step_Edge_Index_T'Image (Index (Edge)));
Output.Trace (
"Original condition"
& Output.Field_Separator
& Arithmetic.Image (Orig_Cond));
Output.Trace (
"Integrated condition"
& Output.Field_Separator
& Arithmetic.Image (New_Cond));
end if;
Flow.Computation.Set_Condition (
On => Edge,
To => New_Cond,
Under => Within);
Conditions_Changed := Conditions_Changed + 1;
end if;
end loop;
end;
Output.Unnest (Step_Mark);
end loop;
if Opt.Trace_Flag_Origins then
Output.Trace (
Locus => Flow.Show.Locus (Graph, Symbol_Table (Using)),
Text =>
"Number of changed conditions"
& Output.Field_Separator
& Natural'Image (Conditions_Changed));
end if;
end Integrate_In_Edge_Conditions;
end Flow.Origins.Of_Condition_Flags;
|
AdaCore/training_material | Ada | 623 | ads | with Crc; use Crc;
package Messages is
type Message_T is private;
function Create
(Text : String;
Field3 : Boolean;
Field4 : Character)
return Message_T;
function Get_Crc
(Message : Message_T)
return Crc_T;
procedure Write (Message : Message_T);
procedure Read
(Message : out Message_T;
Valid : out Boolean);
procedure Print (Message : Message_T);
private
type Message_T is record
Unique_Id : Integer;
Text : String (1 .. 9);
Field3 : Boolean;
Field4 : Character;
Crc : Crc_T;
end record;
end Messages;
|
zhmu/ananas | Ada | 72,295 | adb | ------------------------------------------------------------------------------
-- --
-- GNAT COMPILER COMPONENTS --
-- --
-- D E B U G --
-- --
-- B o d y --
-- --
-- Copyright (C) 1992-2022, Free Software Foundation, Inc. --
-- --
-- GNAT is free software; you can redistribute it and/or modify it under --
-- terms of the GNU General Public License as published by the Free Soft- --
-- ware Foundation; either version 3, or (at your option) any later ver- --
-- sion. GNAT is distributed in the hope that it will be useful, but WITH- --
-- OUT ANY WARRANTY; without even the implied warranty of MERCHANTABILITY --
-- or FITNESS FOR A PARTICULAR PURPOSE. See the GNU General Public License --
-- for more details. You should have received a copy of the GNU General --
-- Public License distributed with GNAT; see file COPYING3. If not, go to --
-- http://www.gnu.org/licenses for a complete copy of the license. --
-- --
-- GNAT was originally developed by the GNAT team at New York University. --
-- Extensive contributions were provided by Ada Core Technologies Inc. --
-- --
------------------------------------------------------------------------------
package body Debug is
---------------------------------
-- Summary of Debug Flag Usage --
---------------------------------
-- Debug flags for compiler (GNAT1)
-- da Generate messages tracking semantic analyzer progress
-- db Show encoding of type names for debug output
-- dc List names of units as they are compiled
-- dd Dynamic allocation of tables messages generated
-- de List the entity table
-- df Full tree/source print (includes withed units)
-- dg Print source from tree (generated code only)
-- dh Generate listing showing loading of name table hash chains
-- di Generate messages for visibility linking/delinking
-- dj Suppress "junk null check" for access parameter values
-- dk Generate GNATBUG message on abort, even if previous errors
-- dl Generate unit load trace messages
-- dm Prevent special frontend inlining in GNATprove mode
-- dn Generate messages for node/list allocation
-- do Print source from tree (original code only)
-- dp Generate messages for parser scope stack push/pops
-- dq No auto-alignment of small records
-- dr Generate parser resynchronization messages
-- ds Print source from tree (including original and generated stuff)
-- dt Print full tree
-- du Uncheck categorization pragmas
-- dv Output trace of overload resolution
-- dw Print trace of semantic scope stack
-- dx Force expansion on, even if no code being generated
-- dy Print tree of package Standard
-- dz Print source of package Standard
-- dA All entities included in representation information output
-- dB Output debug encoding of type names and variants
-- dC Output debugging information on check suppression
-- dD Delete elaboration checks in inner level routines
-- dE Apply elaboration checks to predefined units
-- dF Alternative display for messages over multiple lines
-- dG Generate all warnings including those normally suppressed
-- dH Hold (kill) call to gigi
-- dI Inhibit internal name numbering in gnatG listing
-- dJ Prepend subprogram name in messages
-- dK Kill all error messages
-- dL Ignore external calls from instances for elaboration
-- dM Assume all variables are modified (no current values)
-- dN No file name information in exception messages
-- dO Output immediate error messages
-- dP Do not check for controlled objects in preelaborable packages
-- dQ
-- dR Bypass check for correct version of s-rpc
-- dS Never convert numbers to machine numbers in Sem_Eval
-- dT Convert to machine numbers only for constant declarations
-- dU Enable garbage collection of unreachable entities
-- dV Enable viewing of all symbols in debugger
-- dW Disable warnings on calls for IN OUT parameters
-- dX Display messages on reads of potentially uninitialized scalars
-- dY Enable configurable run-time mode
-- dZ Generate listing showing the contents of the dispatch tables
-- d.a Force Target_Strict_Alignment mode to True
-- d.b Dump backend types
-- d.c Generate inline concatenation, do not call procedure
-- d.d Disable atomic synchronization
-- d.e Enable atomic synchronization
-- d.f Inhibit folding of static expressions
-- d.g Enable conversion of raise into goto
-- d.h Minimize the creation of public internal symbols for concatenation
-- d.i Ignore Warnings pragmas
-- d.j Generate listing of frontend inlined calls
-- d.k Kill referenced run-time library unit line numbers
-- d.l Use Ada 95 semantics for limited function returns
-- d.m For -gnatl, print full source only for main unit
-- d.n Print source file names
-- d.o Conservative elaboration order for indirect calls
-- d.p Use original Ada 95 semantics for Bit_Order (disable AI95-0133)
-- d.q Suppress optimizations on imported 'in'
-- d.r Disable reordering of components in record types
-- d.s Strict secondary stack management
-- d.t Disable static allocation of library level dispatch tables
-- d.u Enable Modify_Tree_For_C (update tree for c)
-- d.v Enforce SPARK elaboration rules in SPARK code
-- d.w Do not check for infinite loops
-- d.x No exception handlers
-- d.y Disable implicit pragma Elaborate_All on task bodies
-- d.z Restore previous support for frontend handling of Inline_Always
-- d.A Enable statistics printing in Atree
-- d.B Generate a bug box on abort_statement
-- d.C Generate concatenation call, do not generate inline code
-- d.D Disable errors on use of overriding keyword in Ada 95 mode
-- d.E Turn selected errors into warnings
-- d.F Debug mode for GNATprove
-- d.G Ignore calls through generic formal parameters for elaboration
-- d.H Disable the support for 128-bit integer types on 64-bit platforms
-- d.I Do not ignore enum representation clauses in CodePeer mode
-- d.J Relaxed rules for pragma No_Return
-- d.K Do not reject components in extensions overlapping with parent
-- d.L Depend on back end for limited types in if and case expressions
-- d.M Relaxed RM semantics
-- d.N
-- d.O Dump internal SCO tables
-- d.P Previous (non-optimized) handling of length comparisons
-- d.Q Previous (incomplete) style check for binary operators
-- d.R Restrictions in ali files in positional form
-- d.S Force Optimize_Alignment (Space)
-- d.T Force Optimize_Alignment (Time)
-- d.U Ignore indirect calls for static elaboration
-- d.V Do not verify validity of SCIL files (CodePeer mode)
-- d.W Print out debugging information for Walk_Library_Items
-- d.X Old treatment of indexing aspects
-- d.Y
-- d.Z Do not enable expansion in configurable run-time mode
-- d_a Stop elaboration checks on accept or select statement
-- d_b Use designated type model under No_Dynamic_Accessibility_Checks
-- d_c CUDA compilation : compile for the host
-- d_d
-- d_e Ignore entry calls and requeue statements for elaboration
-- d_f Issue info messages related to GNATprove usage
-- d_g Disable large static aggregates
-- d_h Disable the use of (perfect) hash functions for enumeration Value
-- d_i Ignore activations and calls to instances for elaboration
-- d_j Read JSON files and populate Repinfo tables (opposite of -gnatRjs)
-- d_k
-- d_l
-- d_m
-- d_n
-- d_o
-- d_p Ignore assertion pragmas for elaboration
-- d_q
-- d_r
-- d_s Stop elaboration checks on synchronous suspension
-- d_t In LLVM-based CCG, dump LLVM IR after transformations are done
-- d_u In LLVM-based CCG, dump flows
-- d_v Enable additional checks and debug printouts in Atree
-- d_w
-- d_x Disable inline expansion of Image attribute for enumeration types
-- d_y
-- d_z
-- d_A Stop generation of ALI file
-- d_B Warn on build-in-place function calls
-- d_C
-- d_D
-- d_E
-- d_F Encode full invocation paths in ALI files
-- d_G
-- d_H
-- d_I
-- d_J
-- d_K (Reserved) Enable reporting a warning on known-problem issues
-- d_L Output trace information on elaboration checking
-- d_M
-- d_N
-- d_O
-- d_P
-- d_Q
-- d_R For LLVM, dump the representation of records
-- d_S
-- d_T Output trace information on invocation path recording
-- d_U Disable prepending messages with "error:".
-- d_V Enable verifications on the expanded tree
-- d_W
-- d_X
-- d_Y
-- d_Z
-- d1 Error msgs have node numbers where possible
-- d2 Eliminate error flags in verbose form error messages
-- d3 Dump bad node in Comperr on an abort
-- d4 Inhibit automatic krunch of predefined library unit files
-- d5 Debug output for tree read/write
-- d6 Default access unconstrained to thin pointers
-- d7 Suppress version/source stamp/compilation time for -gnatv/-gnatl
-- d8 Force opposite endianness in packed stuff
-- d9 Allow lock free implementation
-- d.1 Enable unnesting of nested procedures
-- d.2 Allow statements in declarative part
-- d.3 Output debugging information from Exp_Unst
-- d.4 Do not delete generated C file in case of errors
-- d.5 Do not generate imported subprogram definitions in C code
-- d.6 Do not avoid declaring unreferenced types in C code
-- d.7 Disable unsound heuristics in gnat2scil (for CP as SPARK prover)
-- d.8 Disable unconditional inlining of expression functions
-- d.9 Disable build-in-place for nonlimited types
-- d_1
-- d_2
-- d_3
-- d_4
-- d_5
-- d_6
-- d_7
-- d_8
-- d_9
-- Debug flags for binder (GNATBIND)
-- da All links (including internal units) listed if there is a cycle
-- db Output information from Better_Choice
-- dc List units as they are chosen
-- dd
-- de Elaboration dependencies including system units
-- df
-- dg
-- dh
-- di Ignore_Errors mode for reading ali files
-- dj
-- dk
-- dl
-- dm
-- dn List details of manipulation of Num_Pred values
-- do Use older preference for elaboration order
-- dp Use old preference for elaboration order
-- dq
-- dr
-- ds
-- dt
-- du List units as they are acquired
-- dv Verbose debugging printouts
-- dw
-- dx Force binder to read xref information from ali files
-- dy
-- dz
-- dA
-- dB
-- dC
-- dD
-- dE
-- dF
-- dG
-- dH
-- dI
-- dJ
-- dK
-- dL
-- dM
-- dN
-- dO
-- dP
-- dQ
-- dR
-- dS
-- dT
-- dU
-- dV
-- dW
-- dX
-- dY
-- dZ
-- d.a
-- d.b
-- d.c
-- d.d
-- d.e
-- d.f
-- d.g
-- d.h
-- d.i
-- d.j
-- d.k
-- d.l
-- d.m
-- d.n
-- d.o
-- d.p
-- d.q
-- d.r
-- d.s
-- d.t
-- d.u
-- d.v
-- d.w
-- d.x
-- d.y
-- d.z
-- d.A
-- d.B
-- d.C
-- d.D
-- d.E
-- d.F
-- d.G
-- d.H
-- d.I
-- d.J
-- d.K
-- d.L
-- d.M
-- d.N
-- d.O
-- d.P
-- d.Q
-- d.R
-- d.S
-- d.T
-- d.U
-- d.V
-- d.W
-- d.X
-- d.Y
-- d.Z
-- d.1
-- d.2
-- d.3
-- d.4
-- d.5
-- d.6
-- d.7
-- d.8
-- d.9
-- d_a Ignore the effects of pragma Elaborate_All
-- d_b Ignore the effects of pragma Elaborate_Body
-- d_c
-- d_d
-- d_e Ignore the effects of pragma Elaborate
-- d_f
-- d_g
-- d_h
-- d_i
-- d_j
-- d_k
-- d_l
-- d_m
-- d_n
-- d_o
-- d_p
-- d_q
-- d_r
-- d_s
-- d_t Output cycle-detection trace information
-- d_u
-- d_v
-- d_w
-- d_x
-- d_y
-- d_z
-- d_A Output ALI invocation tables
-- d_B
-- d_C Diagnose all cycles
-- d_D
-- d_E
-- d_F
-- d_G
-- d_H
-- d_I Output invocation graph
-- d_J
-- d_K
-- d_L Output library graph
-- d_M
-- d_N
-- d_O
-- d_P Output cycle paths
-- d_Q
-- d_R
-- d_S Output elaboration-order status
-- d_T Output elaboration-order trace information
-- d_U
-- d_V Validate bindo cycles, graphs, and order
-- d_W
-- d_X
-- d_Y
-- d_Z
-- d_1
-- d_2
-- d_3
-- d_4
-- d_5
-- d_6
-- d_7
-- d_8
-- d_9
-- Debug flags used in package Make and its clients (e.g. GNATMAKE)
-- da
-- db
-- dc
-- dd
-- de
-- df Only output file names, not path names, in log
-- dg
-- dh Generate listing showing loading of name table hash chains
-- di
-- dj
-- dk
-- dl
-- dm Display the number of maximum simultaneous compilations
-- dn Do not delete temp files created by gnatmake
-- do
-- dp Prints the contents of the Q used by Make.Compile_Sources
-- dq Prints source files as they are enqueued and dequeued
-- dr
-- ds
-- dt Display time stamps when there is a mismatch
-- du List units as their ali files are acquired
-- dv
-- dw Prints the list of units withed by the unit currently explored
-- dx
-- dy
-- dz
--------------------------------------------
-- Documentation for Compiler Debug Flags --
--------------------------------------------
-- da Generate messages tracking semantic analyzer progress. A message
-- is output showing each node as it gets analyzed, expanded,
-- resolved, or evaluated. This option is useful for finding out
-- exactly where a bomb during semantic analysis is occurring.
-- db In Exp_Dbug, certain type names are encoded to include debugging
-- information. This debug switch causes lines to be output showing
-- the encodings used.
-- dc List names of units as they are compiled. One line of output will
-- be generated at the start of compiling each unit (package or
-- subprogram).
-- dd Dynamic allocation of tables messages generated. Each time a
-- table is reallocated, a line is output indicating the expansion.
-- de List the entity table
-- df Full tree/source print (includes withed units). Normally the tree
-- output (dt) or recreated source output (dg,do,ds) includes only
-- the main unit. If df is set, then the output in either case
-- includes all compiled units (see also dg,do,ds,dt). Note that to
-- be effective, this switch must be used in combination with one or
-- more of dt, dg, do or ds.
-- dg Print the source recreated from the generated tree. In the case
-- where the tree has been rewritten this output includes only the
-- generated code, not the original code (see also df,do,ds,dz).
-- This flag differs from -gnatG in that the output also includes
-- non-source generated null statements, and freeze nodes, which
-- are normally omitted in -gnatG mode.
-- dh Generates a table at the end of a compilation showing how the hash
-- table chains built by the Namet package are loaded. This is useful
-- in ensuring that the hashing algorithm (in Namet.Hash) is working
-- effectively with typical sets of program identifiers.
-- di Generate messages for visibility linking/delinking
-- dj Suppress "junk null check" for access parameters. This flag permits
-- Ada programs to pass null parameters to access parameters, and to
-- explicitly check such access values against the null literal.
-- Neither of these is valid Ada, but both were allowed in versions of
-- GNAT before 3.10, so this switch can ease the transition process.
-- dk Immediate kill on abort. Normally on an abort (i.e. a call to
-- Comperr.Compiler_Abort), the GNATBUG message is not given if
-- there is a previous error. This debug switch bypasses this test
-- and gives the message unconditionally (useful for debugging).
-- dl Generate unit load trace messages. A line of traceback output is
-- generated each time a request is made to the library manager to
-- load a new unit.
-- dm Prevent special frontend inlining in GNATprove mode. In some cases,
-- some subprogram calls are inlined in GNATprove mode in order to
-- facilitate formal verification. This debug switch prevents that
-- inlining to happen.
-- dn Generate messages for node/list allocation. Each time a node or
-- list header is allocated, a line of output is generated. Certain
-- other basic tree operations also cause a line of output to be
-- generated. This option is useful in seeing where the parser is
-- blowing up.
-- do Print the source recreated from the generated tree. In the case
-- where the tree has been rewritten, this output includes only the
-- original code, not the generated code (see also df,dg,ds,dz).
-- dp Generate messages for parser scope stack push/pops. A line of
-- output by the parser each time the parser scope stack is either
-- pushed or popped. Useful in debugging situations where the
-- parser scope stack ends up incorrectly synchronized
-- dq In layout version 1.38, 2002/01/12, a circuit was implemented
-- to give decent default alignment to short records that had no
-- specific alignment set. This debug option restores the previous
-- behavior of giving such records poor alignments, typically 1.
-- This may be useful in dealing with transition.
-- dr Generate parser resynchronization messages. Normally the parser
-- resynchronizes quietly. With this debug option, two messages
-- are generated, one when the parser starts a resynchronization
-- skip, and another when it resumes parsing. Useful in debugging
-- inadequate error recovery situations.
-- ds Print the source recreated from the generated tree. In the case
-- where the tree has been rewritten this output includes both the
-- generated code and the original code with the generated code
-- being enlosed in curly brackets (see also df,do,ds,dz)
-- dt Print full tree. The generated tree is output (see also df,dy)
-- du Uncheck categorization pragmas. This debug switch causes the
-- elaboration control pragmas (Pure, Preelaborate, etc.) and the
-- categorization pragmas (Shared_Passive, Remote_Types, etc.) to be
-- ignored, so that normal checks are not made (this is particularly
-- useful for adding temporary debugging code to units that have
-- pragmas that are inconsistent with the debugging code added).
-- dv Output trace of overload resolution. Outputs messages for
-- overload attempts that involve cascaded errors, or where
-- an interpretation is incompatible with the context.
-- dw Write semantic scope stack messages. Each time a scope is created
-- or removed, a message is output (see the Sem_Ch8.Push_Scope and
-- Sem_Ch8.Pop_Scope subprograms).
-- dx Force expansion on, even if no code being generated. Normally the
-- expander is inhibited if no code is generated. This switch forces
-- expansion to proceed normally even if the backend is not being
-- called. This is particularly useful for debugging purposes when
-- using the front-end only version of the compiler (which normally
-- would never do any expansion).
-- dy Print tree of package Standard. Normally the tree print out does
-- not include package Standard, even if the -df switch is set. This
-- switch forces output of the internal tree built for Standard.
-- dz Print source of package Standard. Normally the source print out
-- does not include package Standard, even if the -df switch is set.
-- This switch forces output of the source recreated from the internal
-- tree built for Standard. Note that this differs from -gnatS in
-- that it prints from the actual tree using the normal Sprint
-- circuitry for printing trees.
-- dA Forces output of representation information, including full
-- information for all internal type and object entities, as well
-- as all user defined type and object entities including private
-- and incomplete types. This debug switch also automatically sets
-- the equivalent of -gnatRm.
-- dB Output debug encodings for types and variants. See Exp_Dbug for
-- exact form of the generated output.
-- dC Output trace information showing the decisions made during
-- check suppression activity in unit Checks.
-- dD Delete new elaboration checks. This flag causes GNAT to return
-- to the 3.13a elaboration semantics, and to suppress the fixing
-- of two bugs. The first is in the context of inner routines in
-- dynamic elaboration mode, when the subprogram we are in was
-- called at elaboration time by a unit that was also compiled with
-- dynamic elaboration checks. In this case, if A calls B calls C,
-- and all are in different units, we need an elaboration check at
-- each call. These nested checks were only put in recently (see
-- version 1.80 of Sem_Elab) and we provide this debug flag to
-- revert to the previous behavior in case of regressions. The
-- other behavior reverted by this flag is the treatment of the
-- Elaborate_Body pragma in static elaboration mode. This used to
-- be treated as not needing elaboration checking, but in fact in
-- general Elaborate_All is still required because of nested calls.
-- dE Apply compile time elaboration checking for with relations between
-- predefined units. Normally no checks are made.
-- dG Generate all warnings. Normally Errout suppresses warnings on
-- units that are not part of the main extended source, and also
-- suppresses warnings on instantiations in the main extended
-- source that duplicate warnings already posted on the template.
-- This switch stops both kinds of deletion and causes Errout to
-- post all warnings sent to it.
-- dH Inhibit call to gigi. This is useful for testing front end data
-- layout, and may be useful in other debugging situations where
-- you do not want gigi to intefere with the testing.
-- dI Inhibit internal name numbering in gnatDG listing. Any sequence of
-- the form <uppercase-letter><digits><lowercase-letter> appearing in
-- a name is replaced by <uppercase-letter>...<lowercase-letter>. This
-- is used in the fixed bugs run to minimize system and version
-- dependency in filed -gnatD or -gnatG output.
-- dJ Prepend the name of the enclosing subprogram in compiler messages
-- (errors, warnings, style checks). This is useful in particular to
-- integrate compiler warnings in static analysis tools such as
-- CodePeer.
-- dK Kill all error messages. This debug flag suppresses the output
-- of all error messages. It is used in regression tests where the
-- error messages are target dependent and irrelevant.
-- dL The compiler ignores calls in instances and invoke subprograms
-- which are external to the instance for both the static and dynamic
-- elaboration models.
-- dM Assume all variables have been modified, and ignore current value
-- indications. This debug flag disconnects the tracking of constant
-- values (see Exp_Ch2.Expand_Current_Value).
-- dN Do not generate file name information in exception messages
-- dO Output immediate error messages. This causes error messages to
-- be output as soon as they are generated (disconnecting several
-- circuits for improvement of messages, deletion of duplicate
-- messages etc). Useful to diagnose compiler bombs caused by
-- erroneous handling of error situations
-- dP Do not check for controlled objects in preelaborable packages.
-- RM 10.2.1(9) forbids the use of library level controlled objects
-- in preelaborable packages, but this restriction is a huge pain,
-- especially in the predefined library units.
-- dR Bypass the check for a proper version of s-rpc being present
-- to use the -gnatz? switch. This allows debugging of the use
-- of stubs generation without needing to have GLADE (or some
-- other PCS installed).
-- dS Omit conversion of fpt numbers to exact machine numbers in
-- non-static evaluation contexts (see Check_Non_Static_Context).
-- This is intended for testing out timing problems with this
-- conversion circuit.
-- dT Similar to dS, but omits the conversions only in the case where
-- the parent is not a constant declaration.
-- dU Enable garbage collection of unreachable entities. This enables
-- both the reachability analysis and changing the Is_Public and
-- Is_Eliminated flags.
-- dV Enable viewing of all symbols in debugger. Causes debug information
-- to be generated for all symbols, including internal symbols. This
-- is enabled by default for -gnatD, but this switch allows this to
-- be enabled without generating modified source files. Note that the
-- use of -gnatdV ensures in the dwarf/elf case that all symbols that
-- are present in the elf tables are also in the dwarf tables (which
-- seems to be required by some tools). Another effect of dV is to
-- generate full qualified names, including internal names generated
-- for blocks and loops.
-- dW Disable warnings when a possibly uninitialized scalar value is
-- passed to an IN OUT parameter of a procedure. This usage is a
-- quite improper bounded error [erroneous in Ada 83] situation,
-- and would normally generate a warning. However, to ease the
-- task of transitioning incorrect legacy code, we provide this
-- undocumented feature for suppressing these warnings.
-- dY Enable configurable run-time mode, just as though the System file
-- had Configurable_Run_Time_Mode set to True. This is useful in
-- testing high integrity mode.
-- dZ Generate listing showing the contents of the dispatch tables. Each
-- line has an internally generated number used for references between
-- tagged types and primitives. For each primitive the output has the
-- following fields:
--
-- - Letter 'P' or letter 's': The former indicates that this
-- primitive will be located in a primary dispatch table. The
-- latter indicates that it will be located in a secondary
-- dispatch table.
--
-- - Name of the primitive. In case of predefined Ada primitives
-- the text "(predefined)" is added before the name, and these
-- acronyms are used: SR (Stream_Read), SW (Stream_Write), SI
-- (Stream_Input), SO (Stream_Output), DA (Deep_Adjust), DF
-- (Deep_Finalize). In addition Oeq identifies the equality
-- operator, and "_assign" the assignment.
--
-- - If the primitive covers interface types, two extra fields
-- referencing other primitives are generated: "Alias" references
-- the primitive of the tagged type that covers an interface
-- primitive, and "AI_Alias" references the covered interface
-- primitive.
--
-- - The expression "at #xx" indicates the slot of the dispatch
-- table occupied by such primitive in its corresponding primary
-- or secondary dispatch table.
--
-- - In case of abstract subprograms the text "is abstract" is
-- added at the end of the line.
-- d.a Force Target_Strict_Alignment to True, even on targets where it
-- would normally be false. Can be used for testing strict alignment
-- circuitry in the compiler.
-- d.b Dump back end types. During Create_Standard, the back end is
-- queried for all available types. This option shows them.
-- d.c Generate inline concatenation, instead of calling one of the
-- System.Concat_n.Str_Concat_n routines in cases where the latter
-- routines would normally be called.
-- d.d Disable atomic synchronization for all atomic variable references.
-- Pragma Enable_Atomic_Synchronization is ignored.
-- d.e Enable atomic synchronization for all atomic variable references.
-- Pragma Disable_Atomic_Synchronization is ignored, and also the
-- compiler switch -gnated is ignored.
-- d.f Suppress folding of static expressions. This of course results
-- in seriously non-conforming behavior, but is useful sometimes
-- when tracking down handling of complex expressions.
-- d.g Enables conversion of a raise statement into a goto when the
-- relevant handler is statically determinable. For now we only try
-- this if this debug flag is set. Later we will enable this more
-- generally by default.
-- d.h Minimize the creation of public internal symbols for concatenation
-- by enforcing a secondary stack-like handling of the final result.
-- The target of the concatenation is thus constrained in place and
-- initialized with the result instead of acting as its alias.
-- d.i Ignore all occurrences of pragma Warnings in the sources. This can
-- be used in particular to disable Warnings (Off) to check if any of
-- these statements are inappropriate.
-- d.k If an error message contains a reference to a location in an
-- internal unit, then suppress the line number in this reference.
-- d.j Generate listing of frontend inlined calls and inline calls passed
-- to the backend. This is useful to locate skipped calls that must be
-- inlined by the frontend.
-- d.l Use Ada 95 semantics for limited function returns. This may be
-- used to work around the incompatibility introduced by AI-318-2.
-- It is useful only in Ada 2005 and later.
-- d.m When -gnatl is used, the normal output includes full listings of
-- all files in the extended main source (body/spec/subunits). If this
-- debug switch is used, then the full listing is given only for the
-- main source (this corresponds to a previous behavior of -gnatl and
-- is used for running the ACATS tests).
-- d.n Print source file names as they are loaded. This is useful if the
-- compiler has a bug -- these are the files that need to be included
-- in a bug report.
-- d.o Conservative elaboration order for indirect calls. This causes
-- P'Access to be treated as a call in more cases.
-- d.p In Ada 95 (or 83) mode, use original Ada 95 behavior for the
-- interpretation of component clauses crossing byte boundaries when
-- using the non-default bit order (i.e. ignore AI95-0133).
-- d.q If an array variable or constant is not modified in Ada code, and
-- is passed to an 'in' parameter of a foreign-convention subprogram,
-- and that subprogram modifies the array, the Ada compiler normally
-- assumes that the array is not modified. This option suppresses such
-- optimizations. This option should not be used; the correct solution
-- is to declare the parameter 'in out'.
-- d.r Do not reorder components in record types.
-- d.s The compiler no longer attempts to optimize the calls to secondary
-- stack management routines SS_Mark and SS_Release. As a result, each
-- transient block tasked with secondary stack management will fulfill
-- its role unconditionally.
-- d.s The compiler does not generate calls to secondary stack management
-- routines SS_Mark and SS_Release for a transient block when there is
-- an enclosing scoping construct which already manages the secondary
-- stack.
-- d.t The compiler has been modified (a fairly extensive modification)
-- to generate static dispatch tables for library level tagged types.
-- This debug switch disables this modification and reverts to the
-- previous dynamic construction of tables. It is there as a possible
-- work around if we run into trouble with the new implementation.
-- d.u Sets Modify_Tree_For_C mode in which tree is modified to make it
-- easier to generate code using a C compiler.
-- d.v This flag enforces the elaboration rules defined in the SPARK
-- Reference Manual, chapter 7.7, to all SPARK code within a unit. As
-- a result, constructs which violate the rules in chapter 7.7 are no
-- longer accepted, even if the implementation is able to statically
-- ensure that accepting these constructs does not introduce the
-- possibility of failing an elaboration check.
-- d.w This flag turns off the scanning of loops to detect possible
-- infinite loops.
-- d.x No exception handlers in generated code. This causes exception
-- handlers to be eliminated from the generated code. They are still
-- fully compiled and analyzed, they just get eliminated from the
-- code generation step.
-- d.y Disable implicit pragma Elaborate_All on task bodies. When a task
-- body calls a procedure in the same package, and that procedure
-- calls a procedure in another package, the static elaboration
-- machinery adds an implicit Elaborate_All on the other package. This
-- switch disables the addition of the implicit pragma in such cases.
-- d.z Restore previous front-end support for Inline_Always. In default
-- mode, for targets that use the GCC back end, Inline_Always is
-- handled by the back end. Use of this switch restores the previous
-- handling of Inline_Always by the front end on such targets. For the
-- targets that do not use the GCC back end, this switch is ignored.
-- d.A Enable statistics printing in Atree. First set Statistics_Enabled
-- in gen_il-gen.adb to True, then rebuild, then run the compiler
-- with -gnatd.A. You might want to apply "sort -nr" to parts of the
-- output.
-- d.B Generate a bug box when we see an abort_statement, even though
-- there is no bug. Useful for testing Comperr.Compiler_Abort: write
-- some code containing an abort_statement, and compile it with
-- -gnatd.B. There is nothing special about abort_statements; it just
-- provides a way to control where the bug box is generated. See "when
-- N_Abort_Statement" in package body Expander.
-- d.C Generate call to System.Concat_n.Str_Concat_n routines in cases
-- where we would normally generate inline concatenation code.
-- d.D For compatibility with some Ada 95 compilers implementing only
-- one feature of Ada 2005 (overriding keyword), disable errors on use
-- of overriding keyword in Ada 95 mode.
-- d.E Turn selected errors into warnings. This debug switch causes a
-- specific set of error messages into warnings. Setting this switch
-- causes Opt.Error_To_Warning to be set to True. The intention is
-- that this be used for messages representing upwards incompatible
-- changes to Ada 2012 that cause previously correct programs to be
-- treated as illegal now. The following cases are affected:
--
-- Errors relating to overlapping subprogram parameters for cases
-- other than IN OUT parameters to functions.
--
-- Errors relating to the new rules about not defining equality
-- too late so that composition of equality can be assured.
--
-- Errors relating to overriding indicators on protected subprogram
-- bodies (not an Ada 2012 incompatibility, but might cause errors
-- for existing programs assuming they were legal because GNAT
-- formerly allowed them).
-- d.F Sets GNATprove_Mode to True. This allows debugging the frontend in
-- the special mode used by GNATprove.
-- d.G Previously the compiler ignored calls via generic formal parameters
-- when doing the analysis for the static elaboration model. This is
-- now fixed, but we provide this debug flag to revert to the previous
-- situation of ignoring such calls to aid in transition.
-- d.H Disable the support for 128-bit integer types on 64-bit platforms.
-- This makes it easier to mimic the behavior of the current compiler
-- on 32-bit platforms or of older compilers on 64-bit platforms.
-- d.I Do not ignore enum representation clauses in CodePeer mode.
-- The default of ignoring representation clauses for enumeration
-- types in CodePeer is good for the majority of Ada code, but in some
-- cases being able to change this default might be useful to remove
-- some false positives.
-- d.J Relaxed rules for pragma No_Return. A pragma No_Return is illegal
-- if it applies to a body. This switch disables the legality check
-- for that. If the procedure does in fact return normally, execution
-- is erroneous, and therefore unpredictable.
-- d.K Do not reject components in extensions overlapping with the parent
-- component. Such components can be specified by means of a component
-- clause but they cannot be fully supported by the GCC type system.
-- This switch nevertheless allows them for the sake of compatibility.
-- d.L Normally the front end generates special expansion for conditional
-- expressions of a limited type. This debug flag removes this special
-- case expansion, leaving it up to the back end to handle conditional
-- expressions correctly.
-- d.M Relaxed RM semantics. This flag sets Opt.Relaxed_RM_Semantics
-- See Opt.Relaxed_RM_Semantics for more details.
-- d.O Dump internal SCO tables. Before outputting the SCO information to
-- the ALI file, the internal SCO tables (SCO_Table/SCO_Unit_Table)
-- are dumped for debugging purposes.
-- d.P Previous non-optimized handling of length comparisons. Setting this
-- flag inhibits the effect of Optimize_Length_Comparison in Exp_Ch4.
-- This is there in case we find a situation where the optimization
-- malfunctions, to provide a work around.
-- d.Q Previous incomplete style checks for binary operators. Style checks
-- for token separation rules were incomplete and have been made
-- compliant with the documentation. For example, no warning was
-- issued for expressions such as 16-One or "A"&"B". Setting this flag
-- inhibits these new checks.
-- d.R As documented in lib-writ.ads, restrictions in the ali file can
-- have two forms, positional and named. The named notation is the
-- current preferred form, but the use of this debug switch will force
-- the use of the obsolescent positional form.
-- d.S Force Optimize_Alignment (Space) mode as the default
-- d.T Force Optimize_Alignment (Time) mode as the default
-- d.U Ignore indirect calls for static elaboration. The static
-- elaboration model is conservative, especially regarding indirect
-- calls. If you say Proc'Access, it will assume you might call
-- Proc. This can cause elaboration cycles at bind time. This flag
-- reverts to the behavior of earlier compilers, which ignored
-- indirect calls.
-- d.V Do not verify the validity of SCIL files (CodePeer mode). When
-- generating SCIL files for CodePeer, by default we verify that the
-- SCIL is well formed before saving it on disk. This switch can be
-- used to disable this checking, either to improve speed or to shut
-- down a false positive detected during the verification.
-- d.W Print out debugging information for Walk_Library_Items, including
-- the order in which units are walked. This is primarily for use in
-- debugging CodePeer mode.
-- d.X A previous version of GNAT allowed indexing aspects to be redefined
-- on derived container types, while the default iterator was
-- inherited from the parent type. This nonstandard extension is
-- preserved temporarily for use by the modeling project under debug
-- flag d.X.
-- d.Z Normally we always enable expansion in configurable run-time mode
-- to make sure we get error messages about unsupported features even
-- when compiling in -gnatc mode. But expansion is turned off in this
-- case if debug flag -gnatd.Z is used. This is to deal with the case
-- where we discover difficulties in this new processing.
-- d_a The compiler stops the examination of a task body once it reaches
-- an accept or select statement for the static elaboration model. The
-- behavior is similar to that of No_Entry_Calls_In_Elaboration_Code,
-- but does not penalize actual entry calls in elaboration code.
-- d_b When the restriction No_Dynamic_Accessibility_Checks is enabled,
-- use the simple "designated type" accessibility model, instead of
-- using the implicit level of the anonymous access type declaration.
-- d_e The compiler ignores simple entry calls, asynchronous transfer of
-- control, conditional entry calls, timed entry calls, and requeue
-- statements in both the static and dynamic elaboration models.
-- d_f Issue info messages related to GNATprove usage to help users
-- understand analysis results. By default these are not issued as
-- beginners find them confusing. Set automatically by GNATprove when
-- switch --info is used.
-- d_g Disable large static aggregates. The maximum size for a static
-- aggregate will be fairly modest, which is useful if the compiler
-- is using too much memory and time at compile time.
-- d_h The compiler does not make use of (perfect) hash functions in the
-- implementation of the Value attribute for enumeration types.
-- d_i The compiler ignores calls and task activations when they target a
-- subprogram or task type defined in an external instance for both
-- the static and dynamic elaboration models.
-- d_j The compiler reads JSON files that would be generated by the same
-- compilation session if -gnatRjs was passed, in order to populate
-- the internal tables of the Repinfo unit from them.
-- d_p The compiler ignores calls to subprograms which verify the run-time
-- semantics of invariants and postconditions in both the static and
-- dynamic elaboration models.
-- d_s The compiler stops the examination of a task body once it reaches
-- a call to routine Ada.Synchronous_Task_Control.Suspend_Until_True
-- or Ada.Synchronous_Barriers.Wait_For_Release.
-- d_t In the LLVM-based CCG, do an additional dump of the LLVM IR
-- after the pass that does transformations to the IR into a
-- filename ending with .trans.ll.
-- d_u In the LLVM-based CCG, dump flows, both when originally created
-- and after transformations.
-- d_v Enable additional checks and debug printouts in Atree
-- d_x The compiler does not expand in line the Image attribute for user-
-- defined enumeration types and the standard boolean type.
-- d_A Do not generate ALI files by setting Opt.Disable_ALI_File.
-- d_B Warn on build-in-place function calls. This allows users to
-- inspect their code in case it triggers compiler bugs related
-- to build-in-place calls. See known-problem entries for details.
-- d_F The compiler encodes the full path from an invocation construct to
-- an external target, offering additional information to GNATBIND for
-- purposes of error diagnostics.
-- d_K (Reserved) Enable reporting a warning on known-problem issues of
-- previous releases. No action performed in the wavefront.
-- d_L Output trace information on elaboration checking. This debug switch
-- causes output to be generated showing each call or instantiation as
-- it is checked, and the progress of the recursive trace through
-- elaboration calls at compile time.
-- d_R In the LLVM backend, output the internal representation of
-- each record
-- d_T The compiler outputs trace information to standard output whenever
-- an invocation path is recorded.
-- d_U Disable prepending 'error:' to error messages. This used to be the
-- default and can be seen as the opposite of -gnatU.
-- d_V Enable verification of the expanded code before calling the backend
-- and generate error messages on each inconsistency found.
-- d1 Error messages have node numbers where possible. Normally error
-- messages have only source locations. This option is useful when
-- debugging errors caused by expanded code, where the source location
-- does not give enough information.
-- d2 Suppress output of the error position flags for verbose form error
-- messages. The messages are still interspersed in the listing, but
-- without any error flags or extra blank lines. Also causes an extra
-- <<< to be output at the right margin. This is intended to be the
-- easiest format for checking conformance of ACATS B tests. This
-- flag also suppresses the additional messages explaining why a
-- non-static expression is non-static (see Sem_Eval.Why_Not_Static).
-- This avoids having to worry about these messages in ACATS testing.
-- Finally, this flag is also used for strict legality check, in
-- particular it will generate an error instead a warning when
-- encountering an unknown pragma.
-- d3 Causes Comperr to dump the contents of the node for which an abort
-- was detected (normally only the Node_Id of the node is output).
-- d4 Inhibits automatic krunching of predefined library unit file names.
-- Normally, as described in the spec of package Krunch, such files
-- are automatically krunched to 8 characters, with special treatment
-- of the prefixes Ada, System, and Interfaces. Setting this debug
-- switch disables this special treatment.
-- d5 Causes the tree read/write circuit to output detailed information
-- tracking the data that is read and written element by element.
-- d6 Normally access-to-unconstrained-array types are represented
-- using fat (double) pointers. Using this debug flag causes them
-- to default to thin. This can be used to test the performance
-- implications of using thin pointers, and also to test that the
-- compiler functions correctly with this choice.
-- d7 Normally a -gnatl or -gnatv listing includes the time stamp of the
-- source file and the time of the compilation. This debug flag can
-- be used to suppress this output, and also suppresses the message
-- with the version of the compiler. This is useful for regression
-- tests which need to have consistent output.
-- d8 This forces the packed stuff to generate code assuming the
-- opposite endianness from the actual correct value. Useful in
-- testing out code generation from the packed routines.
-- d9 This allows lock free implementation for protected objects
-- (see Exp_Ch9).
-- d.1 Sets Opt.Unnest_Subprogram_Mode to enable unnesting of subprograms.
-- This special pass does not actually unnest things, but it ensures
-- that a nested procedure does not contain any uplevel references.
-- See spec of Exp_Unst for full details.
-- d.2 Allow statements within declarative parts. This is not usually
-- allowed, but in some debugging contexts (e.g. testing the circuit
-- for unnesting of procedures), it is useful to allow this.
-- d.3 Output debugging information from Exp_Unst, including the name of
-- any unreachable subprograms that get deleted.
-- d.4 By default in case of an error during C generation, the .c or .h
-- file is deleted. This flag keeps the C file.
-- d.5 By default a subprogram imported generates a subprogram profile.
-- This debug flag disables this generation when generating C code,
-- assuming a proper #include will be used instead.
-- d.6 By default the C back-end avoids declaring types that are not
-- referenced by the generated C code. This debug flag restores the
-- output of all the types.
-- d.7 Indicates (to gnat2scil) that CodePeer is being invoked as a
-- prover by the SPARK tools and that therefore gnat2scil should
-- avoid SCIL generation strategies which can introduce soundness
-- issues (e.g., assuming that a low bound of an array parameter
-- of an unconstrained subtype belongs to the index subtype).
-- d.8 By default calls to expression functions are always inlined.
-- This debug flag turns off this behavior, making them subject
-- to the usual inlining heuristics of the code generator.
-- d.9 Disable build-in-place for function calls returning nonlimited
-- types.
------------------------------------------
-- Documentation for Binder Debug Flags --
------------------------------------------
-- da Normally if there is an elaboration circularity, then in describing
-- the cycle, links involving internal units are omitted, since they
-- are irrelevant and confusing. This debug flag causes all links to
-- be listed, and is useful when diagnosing circularities introduced
-- by incorrect changes to the run-time library itself.
-- db Output debug information from Better_Choice in Binde, which uses
-- various heuristics to determine elaboration order in cases where
-- multiple orders are valid.
-- dc List units as they are chosen. As units are selected for addition to
-- the elaboration order, a line of output is generated showing which
-- unit has been selected.
-- de Similar to the effect of -e (output complete list of elaboration
-- dependencies) except that internal units are included in the
-- listing.
-- di Normally GNATBIND calls Read_Ali with Ignore_Errors set to False,
-- since the binder really needs correct version ALI files to do its
-- job. This debug flag causes Ignore_Errors mode to be set for the
-- binder (and is particularly useful for testing ignore errors mode).
-- dn List details of manipulation of Num_Pred values during execution of
-- the algorithm used to determine a correct order of elaboration. This
-- is useful in diagnosing any problems in its behavior.
-- do Use older elaboration order preference. The new preference rules
-- prefer specs with no bodies to specs with bodies, and between two
-- specs with bodies, prefers the one whose body is closer to being
-- able to be elaborated. This is a clear improvement, but we provide
-- this debug flag in case of regressions. Note: -do is even older
-- than -dp.
-- dp Use old elaboration order preference. The new preference rules
-- elaborate all units within a strongly connected component together,
-- with no other units in between. In particular, if a spec/body pair
-- can be elaborated together, it will be. In the new order, the binder
-- behaves as if every pragma Elaborate_All that would be legal is
-- present, even if it does not appear in the source code.
-- du List unit name and file name for each unit as it is read in
-- dv Verbose debugging printouts
-- dx Force the binder to read (and then ignore) the xref information
-- in ali files (used to check that read circuit is working OK).
-- d_a GNATBIND ignores the effects of pragma Elaborate_All in the case of
-- elaboration order and treats the associated dependency as a regular
-- with edge.
-- d_b GNATBIND ignores the effects of pragma Elaborate_Body in the case
-- of elaboration order and treats the spec and body as decoupled.
-- d_e GNATBIND ignores the effects of pragma Elaborate in the case of
-- elaboration order and no longer creates an implicit dependency on
-- the body of the argument.
-- d_t GNATBIND output trace information of cycle-detection activities to
-- standard output.
-- d_A GNATBIND output the contents of all ALI invocation-related tables
-- in textual format to standard output.
-- d_C GNATBIND diagnoses all unique cycles within the bind, rather than
-- just the most important one.
-- d_I GNATBIND outputs the contents of the invocation graph in textual
-- format to standard output.
-- d_L GNATBIND outputs the contents of the library graph in textual
-- format to standard output.
-- d_P GNATBIND outputs the cycle paths to standard output
-- d_S GNATBIND outputs trace information concerning the status of its
-- various phases to standard output.
-- d_T GNATBIND outputs trace information of elaboration order detection
-- activities to standard output.
-- d_V GNATBIND validates the invocation graph, library graph along with
-- its cycles, and the elaboration order.
--------------------------------------------
-- Documentation for gnatmake Debug Flags --
--------------------------------------------
-- df Only output file names, not path names, in log
-- dh Generate listing showing loading of name table hash chains,
-- same as for the compiler.
-- dm Issue a message indicating the maximum number of simultaneous
-- compilations.
-- dn Do not delete temporary files created by gnatmake at the end
-- of execution, such as temporary config pragma files, mapping
-- files or project path files. This debug switch is equivalent to
-- the standard switch --keep-temp-files. We retain the debug switch
-- for back compatibility with past usage.
-- dp Prints the Q used by routine Make.Compile_Sources every time
-- we go around the main compile loop of Make.Compile_Sources
-- dq Prints source files as they are enqueued and dequeued in the Q
-- used by routine Make.Compile_Sources. Useful to figure out the
-- order in which sources are recompiled.
-- dt When a time stamp mismatch has been found for an ALI file,
-- display the source file name, the time stamp expected and
-- the time stamp found.
-- du List unit name and file name for each unit as it is read in
-- dw Prints the list of units withed by the unit currently explored
-- during the main loop of Make.Compile_Sources.
---------------------------------------------
-- Documentation for gprbuild Debug Flags --
---------------------------------------------
-- dm Display the maximum number of simultaneous compilations.
-- dn Do not delete temporary files created by gprbuild at the end
-- of execution, such as temporary config pragma files, mapping
-- files or project path files. This debug switch is equivalent to
-- the standard switch --keep-temp-files. We retain the debug switch
-- for back compatibility with past usage.
-- dt When a time stamp mismatch has been found for an ALI file,
-- display the source file name, the time stamp expected and
-- the time stamp found.
--------------------
-- Set_Debug_Flag --
--------------------
procedure Set_Debug_Flag (C : Character; Val : Boolean := True) is
subtype Dig is Character range '1' .. '9';
subtype LLet is Character range 'a' .. 'z';
subtype ULet is Character range 'A' .. 'Z';
begin
if C in Dig then
case Dig (C) is
when '1' =>
Debug_Flag_1 := Val;
when '2' =>
Debug_Flag_2 := Val;
when '3' =>
Debug_Flag_3 := Val;
when '4' =>
Debug_Flag_4 := Val;
when '5' =>
Debug_Flag_5 := Val;
when '6' =>
Debug_Flag_6 := Val;
when '7' =>
Debug_Flag_7 := Val;
when '8' =>
Debug_Flag_8 := Val;
when '9' =>
Debug_Flag_9 := Val;
end case;
elsif C in ULet then
case ULet (C) is
when 'A' =>
Debug_Flag_AA := Val;
when 'B' =>
Debug_Flag_BB := Val;
when 'C' =>
Debug_Flag_CC := Val;
when 'D' =>
Debug_Flag_DD := Val;
when 'E' =>
Debug_Flag_EE := Val;
when 'F' =>
Debug_Flag_FF := Val;
when 'G' =>
Debug_Flag_GG := Val;
when 'H' =>
Debug_Flag_HH := Val;
when 'I' =>
Debug_Flag_II := Val;
when 'J' =>
Debug_Flag_JJ := Val;
when 'K' =>
Debug_Flag_KK := Val;
when 'L' =>
Debug_Flag_LL := Val;
when 'M' =>
Debug_Flag_MM := Val;
when 'N' =>
Debug_Flag_NN := Val;
when 'O' =>
Debug_Flag_OO := Val;
when 'P' =>
Debug_Flag_PP := Val;
when 'Q' =>
Debug_Flag_QQ := Val;
when 'R' =>
Debug_Flag_RR := Val;
when 'S' =>
Debug_Flag_SS := Val;
when 'T' =>
Debug_Flag_TT := Val;
when 'U' =>
Debug_Flag_UU := Val;
when 'V' =>
Debug_Flag_VV := Val;
when 'W' =>
Debug_Flag_WW := Val;
when 'X' =>
Debug_Flag_XX := Val;
when 'Y' =>
Debug_Flag_YY := Val;
when 'Z' =>
Debug_Flag_ZZ := Val;
end case;
else
case LLet (C) is
when 'a' =>
Debug_Flag_A := Val;
when 'b' =>
Debug_Flag_B := Val;
when 'c' =>
Debug_Flag_C := Val;
when 'd' =>
Debug_Flag_D := Val;
when 'e' =>
Debug_Flag_E := Val;
when 'f' =>
Debug_Flag_F := Val;
when 'g' =>
Debug_Flag_G := Val;
when 'h' =>
Debug_Flag_H := Val;
when 'i' =>
Debug_Flag_I := Val;
when 'j' =>
Debug_Flag_J := Val;
when 'k' =>
Debug_Flag_K := Val;
when 'l' =>
Debug_Flag_L := Val;
when 'm' =>
Debug_Flag_M := Val;
when 'n' =>
Debug_Flag_N := Val;
when 'o' =>
Debug_Flag_O := Val;
when 'p' =>
Debug_Flag_P := Val;
when 'q' =>
Debug_Flag_Q := Val;
when 'r' =>
Debug_Flag_R := Val;
when 's' =>
Debug_Flag_S := Val;
when 't' =>
Debug_Flag_T := Val;
when 'u' =>
Debug_Flag_U := Val;
when 'v' =>
Debug_Flag_V := Val;
when 'w' =>
Debug_Flag_W := Val;
when 'x' =>
Debug_Flag_X := Val;
when 'y' =>
Debug_Flag_Y := Val;
when 'z' =>
Debug_Flag_Z := Val;
end case;
end if;
end Set_Debug_Flag;
---------------------------
-- Set_Dotted_Debug_Flag --
---------------------------
procedure Set_Dotted_Debug_Flag (C : Character; Val : Boolean := True) is
subtype Dig is Character range '1' .. '9';
subtype LLet is Character range 'a' .. 'z';
subtype ULet is Character range 'A' .. 'Z';
begin
if C in Dig then
case Dig (C) is
when '1' =>
Debug_Flag_Dot_1 := Val;
when '2' =>
Debug_Flag_Dot_2 := Val;
when '3' =>
Debug_Flag_Dot_3 := Val;
when '4' =>
Debug_Flag_Dot_4 := Val;
when '5' =>
Debug_Flag_Dot_5 := Val;
when '6' =>
Debug_Flag_Dot_6 := Val;
when '7' =>
Debug_Flag_Dot_7 := Val;
when '8' =>
Debug_Flag_Dot_8 := Val;
when '9' =>
Debug_Flag_Dot_9 := Val;
end case;
elsif C in ULet then
case ULet (C) is
when 'A' =>
Debug_Flag_Dot_AA := Val;
when 'B' =>
Debug_Flag_Dot_BB := Val;
when 'C' =>
Debug_Flag_Dot_CC := Val;
when 'D' =>
Debug_Flag_Dot_DD := Val;
when 'E' =>
Debug_Flag_Dot_EE := Val;
when 'F' =>
Debug_Flag_Dot_FF := Val;
when 'G' =>
Debug_Flag_Dot_GG := Val;
when 'H' =>
Debug_Flag_Dot_HH := Val;
when 'I' =>
Debug_Flag_Dot_II := Val;
when 'J' =>
Debug_Flag_Dot_JJ := Val;
when 'K' =>
Debug_Flag_Dot_KK := Val;
when 'L' =>
Debug_Flag_Dot_LL := Val;
when 'M' =>
Debug_Flag_Dot_MM := Val;
when 'N' =>
Debug_Flag_Dot_NN := Val;
when 'O' =>
Debug_Flag_Dot_OO := Val;
when 'P' =>
Debug_Flag_Dot_PP := Val;
when 'Q' =>
Debug_Flag_Dot_QQ := Val;
when 'R' =>
Debug_Flag_Dot_RR := Val;
when 'S' =>
Debug_Flag_Dot_SS := Val;
when 'T' =>
Debug_Flag_Dot_TT := Val;
when 'U' =>
Debug_Flag_Dot_UU := Val;
when 'V' =>
Debug_Flag_Dot_VV := Val;
when 'W' =>
Debug_Flag_Dot_WW := Val;
when 'X' =>
Debug_Flag_Dot_XX := Val;
when 'Y' =>
Debug_Flag_Dot_YY := Val;
when 'Z' =>
Debug_Flag_Dot_ZZ := Val;
end case;
else
case LLet (C) is
when 'a' =>
Debug_Flag_Dot_A := Val;
when 'b' =>
Debug_Flag_Dot_B := Val;
when 'c' =>
Debug_Flag_Dot_C := Val;
when 'd' =>
Debug_Flag_Dot_D := Val;
when 'e' =>
Debug_Flag_Dot_E := Val;
when 'f' =>
Debug_Flag_Dot_F := Val;
when 'g' =>
Debug_Flag_Dot_G := Val;
when 'h' =>
Debug_Flag_Dot_H := Val;
when 'i' =>
Debug_Flag_Dot_I := Val;
when 'j' =>
Debug_Flag_Dot_J := Val;
when 'k' =>
Debug_Flag_Dot_K := Val;
when 'l' =>
Debug_Flag_Dot_L := Val;
when 'm' =>
Debug_Flag_Dot_M := Val;
when 'n' =>
Debug_Flag_Dot_N := Val;
when 'o' =>
Debug_Flag_Dot_O := Val;
when 'p' =>
Debug_Flag_Dot_P := Val;
when 'q' =>
Debug_Flag_Dot_Q := Val;
when 'r' =>
Debug_Flag_Dot_R := Val;
when 's' =>
Debug_Flag_Dot_S := Val;
when 't' =>
Debug_Flag_Dot_T := Val;
when 'u' =>
Debug_Flag_Dot_U := Val;
when 'v' =>
Debug_Flag_Dot_V := Val;
when 'w' =>
Debug_Flag_Dot_W := Val;
when 'x' =>
Debug_Flag_Dot_X := Val;
when 'y' =>
Debug_Flag_Dot_Y := Val;
when 'z' =>
Debug_Flag_Dot_Z := Val;
end case;
end if;
end Set_Dotted_Debug_Flag;
--------------------------------
-- Set_Underscored_Debug_Flag --
--------------------------------
procedure Set_Underscored_Debug_Flag
(C : Character;
Val : Boolean := True)
is
subtype Dig is Character range '1' .. '9';
subtype LLet is Character range 'a' .. 'z';
subtype ULet is Character range 'A' .. 'Z';
begin
if C in Dig then
case Dig (C) is
when '1' =>
Debug_Flag_Underscore_1 := Val;
when '2' =>
Debug_Flag_Underscore_2 := Val;
when '3' =>
Debug_Flag_Underscore_3 := Val;
when '4' =>
Debug_Flag_Underscore_4 := Val;
when '5' =>
Debug_Flag_Underscore_5 := Val;
when '6' =>
Debug_Flag_Underscore_6 := Val;
when '7' =>
Debug_Flag_Underscore_7 := Val;
when '8' =>
Debug_Flag_Underscore_8 := Val;
when '9' =>
Debug_Flag_Underscore_9 := Val;
end case;
elsif C in ULet then
case ULet (C) is
when 'A' =>
Debug_Flag_Underscore_AA := Val;
when 'B' =>
Debug_Flag_Underscore_BB := Val;
when 'C' =>
Debug_Flag_Underscore_CC := Val;
when 'D' =>
Debug_Flag_Underscore_DD := Val;
when 'E' =>
Debug_Flag_Underscore_EE := Val;
when 'F' =>
Debug_Flag_Underscore_FF := Val;
when 'G' =>
Debug_Flag_Underscore_GG := Val;
when 'H' =>
Debug_Flag_Underscore_HH := Val;
when 'I' =>
Debug_Flag_Underscore_II := Val;
when 'J' =>
Debug_Flag_Underscore_JJ := Val;
when 'K' =>
Debug_Flag_Underscore_KK := Val;
when 'L' =>
Debug_Flag_Underscore_LL := Val;
when 'M' =>
Debug_Flag_Underscore_MM := Val;
when 'N' =>
Debug_Flag_Underscore_NN := Val;
when 'O' =>
Debug_Flag_Underscore_OO := Val;
when 'P' =>
Debug_Flag_Underscore_PP := Val;
when 'Q' =>
Debug_Flag_Underscore_QQ := Val;
when 'R' =>
Debug_Flag_Underscore_RR := Val;
when 'S' =>
Debug_Flag_Underscore_SS := Val;
when 'T' =>
Debug_Flag_Underscore_TT := Val;
when 'U' =>
Debug_Flag_Underscore_UU := Val;
when 'V' =>
Debug_Flag_Underscore_VV := Val;
when 'W' =>
Debug_Flag_Underscore_WW := Val;
when 'X' =>
Debug_Flag_Underscore_XX := Val;
when 'Y' =>
Debug_Flag_Underscore_YY := Val;
when 'Z' =>
Debug_Flag_Underscore_ZZ := Val;
end case;
else
case LLet (C) is
when 'a' =>
Debug_Flag_Underscore_A := Val;
when 'b' =>
Debug_Flag_Underscore_B := Val;
when 'c' =>
Debug_Flag_Underscore_C := Val;
when 'd' =>
Debug_Flag_Underscore_D := Val;
when 'e' =>
Debug_Flag_Underscore_E := Val;
when 'f' =>
Debug_Flag_Underscore_F := Val;
when 'g' =>
Debug_Flag_Underscore_G := Val;
when 'h' =>
Debug_Flag_Underscore_H := Val;
when 'i' =>
Debug_Flag_Underscore_I := Val;
when 'j' =>
Debug_Flag_Underscore_J := Val;
when 'k' =>
Debug_Flag_Underscore_K := Val;
when 'l' =>
Debug_Flag_Underscore_L := Val;
when 'm' =>
Debug_Flag_Underscore_M := Val;
when 'n' =>
Debug_Flag_Underscore_N := Val;
when 'o' =>
Debug_Flag_Underscore_O := Val;
when 'p' =>
Debug_Flag_Underscore_P := Val;
when 'q' =>
Debug_Flag_Underscore_Q := Val;
when 'r' =>
Debug_Flag_Underscore_R := Val;
when 's' =>
Debug_Flag_Underscore_S := Val;
when 't' =>
Debug_Flag_Underscore_T := Val;
when 'u' =>
Debug_Flag_Underscore_U := Val;
when 'v' =>
Debug_Flag_Underscore_V := Val;
when 'w' =>
Debug_Flag_Underscore_W := Val;
when 'x' =>
Debug_Flag_Underscore_X := Val;
when 'y' =>
Debug_Flag_Underscore_Y := Val;
when 'z' =>
Debug_Flag_Underscore_Z := Val;
end case;
end if;
end Set_Underscored_Debug_Flag;
end Debug;
|
OneWingedShark/Byron | Ada | 116 | ads | Pragma Ada_2012;
Pragma Assertion_Policy( Check );
Package Byron.IRs with Pure, Spark_Mode => On is
End Byron.IRs;
|
AdaCore/langkit | Ada | 1,256 | adb | with Ada.Text_IO; use Ada.Text_IO;
with GNATCOLL.VFS; use GNATCOLL.VFS;
with Langkit_Support.Diagnostics; use Langkit_Support.Diagnostics;
with Langkit_Support.Errors;
with Langkit_Support.Text; use Langkit_Support.Text;
with Libfoolang.Analysis; use Libfoolang.Analysis;
procedure Process_Apply
(Handle : in out Rewriting_Handle;
Abort_On_Error : Boolean := True)
is
Result : constant Apply_Result := Apply (Handle);
begin
if not Result.Success then
declare
F : constant String :=
+Create (+Get_Filename (Result.Unit)).Base_Name;
Unit : constant Unit_Rewriting_Handle :=
Libfoolang.Rewriting.Handle (Result.Unit);
begin
Put_Line ("Could not apply diff on the " & F & " unit:");
for D of Result.Diagnostics loop
Put_Line (" " & To_Pretty_String (D));
end loop;
begin
Put_Line (Image (Unparse (Root (Unit))));
exception
when Langkit_Support.Errors.Unparsing.Malformed_Tree_Error =>
Put_Line ("Cannot unparse the rewritten tree");
end;
if Abort_On_Error then
raise Program_Error;
end if;
end;
end if;
end Process_Apply;
|
stcarrez/ada-util | Ada | 1,226 | ads | -----------------------------------------------------------------------
-- Util.Beans.Objects.To_Access -- Conversion utility
-- 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.
-----------------------------------------------------------------------
-- Convert the object to the corresponding access type.
-- Returns null if the object is not a <b>TYPE_BEAN</b> or not of the given bean type.
with Util.Beans.Basic;
generic
type T is limited new Util.Beans.Basic.Readonly_Bean with private;
type T_Access is access all T'Class;
function Util.Beans.Objects.To_Access (Value : in Object) return T_Access;
|
AdaCore/training_material | Ada | 298 | adb | Student_Per_Day.Append (10);
Student_Per_Day.Append (8);
Student_Per_Day.Append (9);
Received_Parcels.Insert ("FEDEX AX431661VD");
Received_Parcels.Insert ("UPS ZZ-44-I12");
Math_Constants.Insert
(To_Unbounded_String ("Pi"), 3.141_59);
Math_Constants.Insert (To_Unbounded_String ("e"), 2.718);
|
tum-ei-rcs/StratoX | Ada | 417 | ads | -- Institution: Technische Universität München
-- Department: Realtime Computer Systems (RCS)
-- Project: StratoX
-- Module: Software Configuration
--
-- Authors: Emanuel Regnath ([email protected])
--
-- Description:
-- Configuration of the Software, adjust these parameters to your needs
package Config is
MAIN_TICK_RATE_MS : constant := 10; -- Tickrate in Milliseconds
end Config;
|
adrianhoe/adactfft | Ada | 537 | ads | --------------------------------------------------------------------------------
-- * Spec name ctfft.ads
-- * Project name ctffttest
-- *
-- * Version 1.0
-- * Last update 11/5/08
-- *
-- * Created by Adrian Hoe on 11/5/08.
-- * Copyright (c) 2008 AdaStar Informatics http://adastarinformatics.com
-- * All rights reserved.
-- *
--------------------------------------------------------------------------------
with Vector;
use Vector;
package Ctfft is
procedure Fft (X : in out Real_Vector_Type);
end Ctfft;
|
AdaCore/libadalang | Ada | 42,592 | adb | --
-- Copyright (C) 2014-2022, AdaCore
-- SPDX-License-Identifier: Apache-2.0
--
with Ada.Containers.Hashed_Maps;
with Ada.Containers.Hashed_Sets;
with Ada.Strings.Unbounded.Hash;
with GNAT.OS_Lib;
with GNAT.Task_Lock;
with GNATCOLL.Strings; use GNATCOLL.Strings;
with GNATCOLL.VFS; use GNATCOLL.VFS;
with GPR2.Project.Unit_Info;
with GPR2.Unit;
with Libadalang.GPR_Utils; use Libadalang.GPR_Utils;
with Libadalang.Implementation; use Libadalang.Implementation;
with Libadalang.Unit_Files;
package body Libadalang.Project_Provider is
package Filename_Sets is new Ada.Containers.Hashed_Sets
(Element_Type => Virtual_File,
Hash => Full_Name_Hash,
Equivalent_Elements => "=");
use type Ada.Containers.Count_Type;
package US renames Ada.Strings.Unbounded;
use type US.Unbounded_String;
------------------------
-- GPR1 unit provider --
------------------------
type Project_Data (Kind : Project_Kind := GPR1_Kind) is record
case Kind is
when GPR1_Kind =>
GPR1_Tree : Prj.Project_Tree_Access;
GPR1_Env : Prj.Project_Environment_Access;
GPR1_Is_Project_Owner : Boolean;
when GPR2_Kind =>
GPR2_Tree : access GPR2.Project.Tree.Object;
end case;
end record;
type Project_Unit_Provider is new LAL.Unit_Provider_Interface with record
Data : Project_Data;
Projects : View_Vectors.Vector;
end record;
-- Unit provider backed up by a project file
type Project_Unit_Provider_Access is access all Project_Unit_Provider;
overriding function Get_Unit_Filename
(Provider : Project_Unit_Provider;
Name : Text_Type;
Kind : Analysis_Unit_Kind) return String;
overriding procedure Get_Unit_Location
(Provider : Project_Unit_Provider;
Name : Text_Type;
Kind : Analysis_Unit_Kind;
Filename : in out US.Unbounded_String;
PLE_Root_Index : in out Natural);
overriding function Get_Unit
(Provider : Project_Unit_Provider;
Context : LAL.Analysis_Context'Class;
Name : Text_Type;
Kind : Analysis_Unit_Kind;
Charset : String := "";
Reparse : Boolean := False) return LAL.Analysis_Unit'Class;
overriding procedure Get_Unit_And_PLE_Root
(Provider : Project_Unit_Provider;
Context : LAL.Analysis_Context'Class;
Name : Text_Type;
Kind : Analysis_Unit_Kind;
Charset : String := "";
Reparse : Boolean := False;
Unit : in out LAL.Analysis_Unit'Class;
PLE_Root_Index : in out Natural);
overriding procedure Release (Provider : in out Project_Unit_Provider);
------------------------------------------
-- Helpers to create project partitions --
------------------------------------------
type Any_Provider_And_Projects is record
Provider : LAL.Unit_Provider_Reference;
Projects : View_Vectors.Vector;
end record;
-- Provider_And_Projects equivalent that is GPR library agnostic
type Any_Provider_And_Projects_Array is
array (Positive range <>) of Any_Provider_And_Projects;
type Any_Provider_And_Projects_Array_Access is
access all Any_Provider_And_Projects_Array;
procedure Free is new Ada.Unchecked_Deallocation
(Any_Provider_And_Projects_Array, Any_Provider_And_Projects_Array_Access);
type Files_For_Unit is record
Spec_File, Body_File : aliased US.Unbounded_String;
end record;
-- Identify the source files that implement one unit (spec & body for a
-- specific unit name, when present).
procedure Set_Unit_File
(FFU : in out Files_For_Unit;
File : String;
Part : Any_Unit_Part);
-- Register the couple File/Part in FFU
package Unit_Files_Maps is new Ada.Containers.Hashed_Maps
(Key_Type => US.Unbounded_String,
Element_Type => Files_For_Unit,
Equivalent_Keys => US."=",
Hash => US.Hash);
-- Associate a set of files to unit names
procedure Set_Unit_File
(Unit_Files : in out Unit_Files_Maps.Map;
Unit_Name : String;
Unit_Part : Any_Unit_Part;
Filename : String);
-- Wrapper around Set_Unit_File to register the couple Filename/Unit_Part
-- in the appropriate Unit_Files' entry. Create such an entry if needed.
type Aggregate_Part is record
Projects : View_Vectors.Vector;
Unit_Files : Unit_Files_Maps.Map;
end record;
-- Group of projects that make up one part in the aggregated projects
-- partition.
function Part_Image (Part : Aggregate_Part) return String;
-- Return a human-readable string that represent the set of projects in
-- Part.
type Aggregate_Part_Access is access all Aggregate_Part;
procedure Free is new Ada.Unchecked_Deallocation
(Aggregate_Part, Aggregate_Part_Access);
function Try_Merge
(Part : in out Aggregate_Part;
Project : Any_View;
Unit_Files : in out Unit_Files_Maps.Map) return Boolean;
-- If all common unit names in ``Part.Unit_Files`` and ``Unit_Files`` are
-- associated with the same source files, update ``Part`` so that
-- ``Project`` is part of it, clear ``Unit_Files`` and return True. Do
-- nothing and return False otherwise.
package Aggregate_Part_Vectors is new Ada.Containers.Vectors
(Positive, Aggregate_Part_Access);
procedure Free (Partition : in out Aggregate_Part_Vectors.Vector);
function Create_Project_Unit_Provider
(Tree : Any_Tree;
Views : View_Vectors.Vector) return LAL.Unit_Provider_Reference;
-- Helper to create a ``Project_Unit_Provider`` reference based on the
-- given ``Tree`` and ``Views``.
function Create_Project_Unit_Providers
(Tree : Any_Tree) return Any_Provider_And_Projects_Array_Access;
-- Common implementation for the homonym public functions
procedure Create_Project_Unit_Provider
(Tree : Any_Tree;
View : Any_View;
Provider : out Project_Unit_Provider_Access;
Provider_Ref : out LAL.Unit_Provider_Reference);
-- Common implementation for the homonym public functions.
--
-- Try to create a single unit provider for the given ``Tree``/``View``
-- (``View`` being ``No_View`` means: use the root project). On success,
-- set ``Provider`` and ``Provider_Ref`` to the created unit provider. On
-- failure, raise an ``Unsupported_View_Error`` exception.
procedure Create_Sorted_Filenames
(File_Set : Filename_Sets.Set;
File_Vector : out Filename_Vectors.Vector);
-- Sort files in ``File_Set`` and put the result in ``File_Vector``
function Default_Charset_From_Project
(Tree : Any_Tree; View : Any_View) return String;
-- Common implementation for the homonym public functions
-------------------
-- Set_Unit_File --
-------------------
procedure Set_Unit_File
(FFU : in out Files_For_Unit;
File : String;
Part : Any_Unit_Part)
is
Unit_File : constant access US.Unbounded_String :=
(case Part is
when Unit_Spec => FFU.Spec_File'Access,
when Unit_Body => FFU.Body_File'Access);
begin
pragma Assert (Unit_File.all = US.Null_Unbounded_String);
Unit_File.all :=
(if File = ""
then US.Null_Unbounded_String
else US.To_Unbounded_String
(+Create (+File).Full_Name (Normalize => True)));
end Set_Unit_File;
-------------------
-- Set_Unit_File --
-------------------
procedure Set_Unit_File
(Unit_Files : in out Unit_Files_Maps.Map;
Unit_Name : String;
Unit_Part : Any_Unit_Part;
Filename : String)
is
use Unit_Files_Maps;
-- TODO??? Refactor to make a single lookup/insertion
UN : constant US.Unbounded_String :=
US.To_Unbounded_String (Unit_Name);
Pos : Cursor := Unit_Files.Find (UN);
Inserted : Boolean;
begin
if not Has_Element (Pos) then
Unit_Files.Insert (UN, Pos, Inserted);
pragma Assert (Inserted);
end if;
Set_Unit_File (Unit_Files.Reference (Pos), Filename, Unit_Part);
end Set_Unit_File;
----------------
-- Part_Image --
----------------
function Part_Image (Part : Aggregate_Part) return String is
use Ada.Strings.Unbounded;
Image : Unbounded_String;
First : Boolean := True;
begin
Append (Image, "<");
for View of Part.Projects loop
if First then
First := False;
else
Append (Image, ", ");
end if;
Append (Image, Name (View));
end loop;
Append (Image, ">");
return To_String (Image);
end Part_Image;
---------------
-- Try_Merge --
---------------
function Try_Merge
(Part : in out Aggregate_Part;
Project : Any_View;
Unit_Files : in out Unit_Files_Maps.Map) return Boolean
is
use Unit_Files_Maps;
begin
-- If Part contains nothing yet, no need to do the costly overlap check:
-- just move info there and return.
if Part.Unit_Files.Is_Empty then
Part.Projects.Append (Project);
Part.Unit_Files.Move (Unit_Files);
return True;
end if;
-- Otherwise, first check that Part.Unit_Files and Unit_Files don't have
-- conflicting units.
for Prj_Pos in Unit_Files.Iterate loop
declare
use Ada.Strings.Unbounded;
Unit_Name : constant Unbounded_String := Key (Prj_Pos);
Part_Pos : constant Cursor := Part.Unit_Files.Find (Unit_Name);
begin
if Has_Element (Part_Pos)
and then Unit_Files.Reference (Prj_Pos).Element.all
/= Part.Unit_Files.Reference (Part_Pos).Element.all
then
if Trace.Is_Active then
Trace.Trace
("Found conflicting source files for unit "
& To_String (Unit_Name) & " in " & Name (Project)
& " and " & Part_Image (Part));
end if;
return False;
end if;
end;
end loop;
-- Finally merge Project and Unit_Files into Part
Part.Projects.Append (Project);
for Prj_Pos in Unit_Files.Iterate loop
declare
Dummy_Cursor : Cursor;
Dummy_Inserted : Boolean;
begin
Part.Unit_Files.Insert
(Key (Prj_Pos), Element (Prj_Pos), Dummy_Cursor, Dummy_Inserted);
end;
end loop;
return True;
end Try_Merge;
----------
-- Free --
----------
procedure Free (Partition : in out Aggregate_Part_Vectors.Vector) is
begin
for Part of Partition loop
Free (Part);
end loop;
Partition.Clear;
end Free;
----------
-- Free --
----------
procedure Free (PAP_Array : in out Provider_And_Projects_Array_Access) is
procedure Deallocate is new Ada.Unchecked_Deallocation
(Provider_And_Projects_Array, Provider_And_Projects_Array_Access);
begin
for PAP of PAP_Array.all loop
Prj.Unchecked_Free (PAP.Projects);
end loop;
Deallocate (PAP_Array);
end Free;
----------------------------------
-- Create_Project_Unit_Provider --
----------------------------------
function Create_Project_Unit_Provider
(Tree : Any_Tree;
Views : View_Vectors.Vector) return LAL.Unit_Provider_Reference
is
Provider : Project_Unit_Provider;
Data : Project_Data renames Provider.Data;
begin
case Tree.Kind is
when GPR1_Kind =>
Data :=
(Kind => GPR1_Kind,
GPR1_Tree => Tree.GPR1_Value,
GPR1_Env => null,
GPR1_Is_Project_Owner => False);
when GPR2_Kind =>
Data :=
(Kind => GPR2_Kind, GPR2_Tree => Tree.GPR2_Value.Reference);
end case;
Provider.Projects := Views;
return LAL.Create_Unit_Provider_Reference (Provider);
end Create_Project_Unit_Provider;
-----------------------------------
-- Create_Project_Unit_Providers --
-----------------------------------
function Create_Project_Unit_Providers
(Tree : Any_Tree) return Any_Provider_And_Projects_Array_Access
is
Partition : Aggregate_Part_Vectors.Vector;
begin
Trace.Increase_Indent ("Trying to partition " & Name (Root (Tree)));
if Is_Aggregate_Project (Root (Tree)) then
-- We have an aggregate project: partition aggregated projects so
-- that each unit providers (associated to one exclusive set of
-- projects) has visibility on only one version of a unit.
declare
Views : View_Vectors.Vector := Aggregated_Projects (Root (Tree));
function "<" (Left, Right : Any_View) return Boolean is
(Name (Left) < Name (Right));
package Sorting is new View_Vectors.Generic_Sorting;
begin
-- Sort views by name so that our output is deterministic:
-- Aggregated_Project does not specify the order of projects in
-- its result.
Sorting.Sort (Views);
-- For each aggregated project...
Aggregate_Iteration : for View of Views loop
declare
-- List all units defined and keep track of which source
-- files implement them.
Unit_Files : Unit_Files_Maps.Map;
procedure Process
(Unit_Name : String;
Unit_Part : Any_Unit_Part;
Filename : String);
-------------
-- Process --
-------------
procedure Process
(Unit_Name : String;
Unit_Part : Any_Unit_Part;
Filename : String) is
begin
Set_Unit_File
(Unit_Files, Unit_Name, Unit_Part, Filename);
end Process;
New_Part_Needed : Boolean := True;
begin
Iterate_Ada_Units (Tree, View, Process'Access);
-- Then look for a part whose units do not conflict with
-- Unit_Files. Create a new one if there is no such part.
Part_Lookup : for Part of Partition loop
if Try_Merge (Part.all, View, Unit_Files) then
New_Part_Needed := False;
exit Part_Lookup;
end if;
end loop Part_Lookup;
if New_Part_Needed then
declare
Part : constant Aggregate_Part_Access :=
new Aggregate_Part;
Success : constant Boolean :=
Try_Merge (Part.all, View, Unit_Files);
begin
pragma Assert (Success);
Partition.Append (Part);
end;
end if;
end;
end loop Aggregate_Iteration;
end;
-- If the partition is empty (there was no aggregated project),
-- create one unit provider anyway: this provider will refer to an
-- empty list of projects.
if Partition.Is_Empty then
Partition.Append (new Aggregate_Part);
end if;
else
-- Project is not an aggregate project, so the partition is obvious:
-- one part that contains the root project.
declare
Part : constant Aggregate_Part_Access := new Aggregate_Part;
begin
Part.Projects.Append (Root (Tree));
Partition.Append (Part);
end;
end if;
Trace.Decrease_Indent;
-- For debuggability, log how the Tree was partitioned
if Trace.Is_Active then
Trace.Increase_Indent ("Input project partitioned into:");
for Cur in Partition.Iterate loop
declare
N : constant Positive :=
Aggregate_Part_Vectors.To_Index (Cur);
Part : Aggregate_Part renames Partition.Element (N).all;
begin
Trace.Trace ("Part" & N'Image & ": " & Part_Image (Part));
end;
end loop;
Trace.Decrease_Indent;
end if;
-- The partition is ready: turn each part into a unit provider and
-- return the list.
return Result : constant Any_Provider_And_Projects_Array_Access :=
new Any_Provider_And_Projects_Array (1 .. Natural (Partition.Length))
do
for I in Result.all'Range loop
declare
Views : View_Vectors.Vector renames Partition (I).Projects;
begin
Result (I).Provider :=
Create_Project_Unit_Provider (Tree, Views);
Result (I).Projects := Views;
end;
end loop;
Free (Partition);
end return;
end Create_Project_Unit_Providers;
----------------------------------
-- Create_Project_Unit_Provider --
----------------------------------
procedure Create_Project_Unit_Provider
(Tree : Any_Tree;
View : Any_View;
Provider : out Project_Unit_Provider_Access;
Provider_Ref : out LAL.Unit_Provider_Reference)
is
Actual_View : Any_View := View;
begin
-- If no project was given, try to run the partitionner
if Actual_View = No_View (Tree) then
declare
PAPs : Any_Provider_And_Projects_Array_Access :=
Create_Project_Unit_Providers (Tree);
begin
if PAPs.all'Length > 1 then
Free (PAPs);
raise Unsupported_View_Error with "inconsistent units found";
end if;
-- We only have one provider: return it
Provider_Ref := PAPs.all (PAPs.all'First).Provider;
Provider :=
Project_Unit_Provider_Access (Provider_Ref.Unchecked_Get);
Free (PAPs);
return;
end;
end if;
-- Peel the aggregate project layers (if any) around Actual_View. If we
-- find an aggregate project with more than one aggregated project, this
-- is an unsupported case.
while Is_Aggregate_Project (Actual_View) loop
declare
Subprojects : constant View_Vectors.Vector :=
Aggregated_Projects (Actual_View);
begin
exit when Subprojects.Length /= 1;
Actual_View := Subprojects.First_Element;
end;
end loop;
if Is_Aggregate_Project (Actual_View) then
raise Unsupported_View_Error with
"selected project is aggregate and has more than one sub-project";
end if;
declare
Views : View_Vectors.Vector;
begin
Views.Append (Actual_View);
Provider_Ref := Create_Project_Unit_Provider (Tree, Views);
Provider :=
Project_Unit_Provider_Access (Provider_Ref.Unchecked_Get);
end;
end Create_Project_Unit_Provider;
-----------------------------------
-- Create_Project_Unit_Providers --
-----------------------------------
function Create_Project_Unit_Providers
(Tree : Prj.Project_Tree_Access) return Provider_And_Projects_Array_Access
is
Result : Any_Provider_And_Projects_Array_Access :=
Create_Project_Unit_Providers
((Kind => GPR1_Kind, GPR1_Value => Tree));
begin
-- Convert Result (GPR library agnostic data structure) into the return
-- type (GPR1-specific data structure).
return R : constant Provider_And_Projects_Array_Access :=
new Provider_And_Projects_Array (Result.all'Range)
do
for I in R.all'Range loop
R (I).Provider := Result (I).Provider;
declare
Projects : View_Vectors.Vector renames Result (I).Projects;
P : Prj.Project_Array_Access renames R (I).Projects;
begin
P := new Prj.Project_Array (1 .. Natural (Projects.Length));
for I in P.all'Range loop
P (I) := Projects (I).GPR1_Value;
end loop;
end;
end loop;
Free (Result);
end return;
end Create_Project_Unit_Providers;
----------------------------------
-- Create_Project_Unit_Provider --
----------------------------------
function Create_Project_Unit_Provider
(Tree : Prj.Project_Tree_Access;
Project : Prj.Project_Type := Prj.No_Project;
Env : Prj.Project_Environment_Access;
Is_Project_Owner : Boolean := True)
return LAL.Unit_Provider_Reference
is
Provider : Project_Unit_Provider_Access;
begin
return Result : LAL.Unit_Provider_Reference do
Create_Project_Unit_Provider
(Tree => (Kind => GPR1_Kind, GPR1_Value => Tree),
View => (Kind => GPR1_Kind, GPR1_Value => Project),
Provider => Provider,
Provider_Ref => Result);
Provider.Data.GPR1_Env := Env;
Provider.Data.GPR1_Is_Project_Owner := Is_Project_Owner;
end return;
end Create_Project_Unit_Provider;
-----------------------
-- Get_Unit_Filename --
-----------------------
overriding function Get_Unit_Filename
(Provider : Project_Unit_Provider;
Name : Text_Type;
Kind : Analysis_Unit_Kind) return String is
begin
-- Get_Unit_Location is supposed to handle all cases, so this should be
-- dead code.
return (raise Program_Error);
end Get_Unit_Filename;
-----------------------
-- Get_Unit_Location --
-----------------------
overriding procedure Get_Unit_Location
(Provider : Project_Unit_Provider;
Name : Text_Type;
Kind : Analysis_Unit_Kind;
Filename : in out US.Unbounded_String;
PLE_Root_Index : in out Natural)
is
Str_Name : constant String :=
Libadalang.Unit_Files.Unit_String_Name (Name);
begin
case Provider.Data.Kind is
when GPR1_Kind =>
begin
-- GNATCOLL.Projects does not provide the compilation unit index
-- information: we have to assume that there are always at most
-- one compilation unit per source file.
PLE_Root_Index := 1;
-- Look for a source file corresponding to Name/Kind in all
-- projects associated to this Provider.
GNAT.Task_Lock.Lock;
-- Unlike what is documented, it's not because File_From_Unit
-- returns an non-empty string that the unit does belong to the
-- project, so we must also check Create_From_Project's result.
for View of Provider.Projects loop
declare
P : constant Prj.Project_Type := View.GPR1_Value;
File : constant Filesystem_String := Prj.File_From_Unit
(Project => P,
Unit_Name => Str_Name,
Part => Convert (Kind),
Language => "Ada");
begin
if File'Length /= 0 then
declare
Path : constant GNATCOLL.VFS.Virtual_File :=
Prj.Create_From_Project (P, File).File;
Fullname : constant String := +Path.Full_Name;
begin
if Fullname'Length /= 0 then
GNAT.Task_Lock.Unlock;
Filename := US.To_Unbounded_String (Fullname);
return;
end if;
end;
end if;
end;
end loop;
GNAT.Task_Lock.Unlock;
exception
when others =>
GNAT.Task_Lock.Unlock;
raise;
end;
when GPR2_Kind =>
declare
procedure Set (SUI : GPR2.Unit.Source_Unit_Identifier);
-- Set ``Filename`` and ``PLE_Root_Index`` from ``SUI``'s
function Lookup (View : GPR2.Project.View.Object) return Boolean;
-- If ``View`` contains the requested unit, return ``True`` and
-- set ``Filename`` to the corresponding filename. Return
-- ``False`` otherwise.
Unit_Name : constant GPR2.Name_Type := GPR2.Name_Type (Str_Name);
---------
-- Set --
---------
procedure Set (SUI : GPR2.Unit.Source_Unit_Identifier) is
use type GPR2.Unit_Index;
begin
-- GPR2 sets the CU index to 0 when there is no "at N" clause
-- in the project file. This is equivalont to "at 1", which is
-- what we need here since PLE_Root_Index is a Positive.
Filename := US.To_Unbounded_String (SUI.Source.Value);
PLE_Root_Index :=
(if SUI.Index = 0 then 1 else Positive (SUI.Index));
end Set;
------------
-- Lookup --
------------
function Lookup (View : GPR2.Project.View.Object) return Boolean is
Unit : constant GPR2.Project.Unit_Info.Object :=
View.Unit (Unit_Name);
begin
if Unit.Is_Defined then
case Kind is
when Unit_Specification =>
if Unit.Has_Spec then
Set (Unit.Spec);
return True;
end if;
when Unit_Body =>
if Unit.Has_Body then
Set (Unit.Main_Body);
return True;
end if;
end case;
end if;
return False;
end Lookup;
Tree : GPR2.Project.Tree.Object renames
Provider.Data.GPR2_Tree.all;
begin
-- Look for all the requested unit in the closure of all the
-- projects that this provider handles.
for View of Provider.Projects loop
for V of Closure (View.GPR2_Value) loop
if Lookup (V) then
return;
end if;
end loop;
end loop;
-- Also look in the runtime project, if any
if Tree.Has_Runtime_Project and then Lookup (Tree.Runtime_Project)
then
return;
end if;
end;
end case;
-- If we reach this point, we have not found a unit handled by this
-- provider that matches the requested name/kind.
Filename := US.Null_Unbounded_String;
PLE_Root_Index := 1;
end Get_Unit_Location;
--------------
-- Get_Unit --
--------------
overriding function Get_Unit
(Provider : Project_Unit_Provider;
Context : LAL.Analysis_Context'Class;
Name : Text_Type;
Kind : Analysis_Unit_Kind;
Charset : String := "";
Reparse : Boolean := False) return LAL.Analysis_Unit'Class
is
-- Get_Unit_And_PLE_Root is supposed to handle all cases, so this should
-- be dead code.
pragma Unreferenced (Provider, Context, Name, Kind, Charset, Reparse);
begin
return (raise Program_Error);
end Get_Unit;
---------------------------
-- Get_Unit_And_PLE_Root --
---------------------------
overriding procedure Get_Unit_And_PLE_Root
(Provider : Project_Unit_Provider;
Context : LAL.Analysis_Context'Class;
Name : Text_Type;
Kind : Analysis_Unit_Kind;
Charset : String := "";
Reparse : Boolean := False;
Unit : in out LAL.Analysis_Unit'Class;
PLE_Root_Index : in out Natural)
is
Filename : US.Unbounded_String;
begin
Provider.Get_Unit_Location (Name, Kind, Filename, PLE_Root_Index);
pragma Assert (PLE_Root_Index > 0);
if US.Length (Filename) > 0 then
Unit := LAL.Analysis_Unit'Class
(Context.Get_From_File (US.To_String (Filename), Charset, Reparse));
else
declare
Dummy_File : constant String :=
Libadalang.Unit_Files.File_From_Unit (Name, Kind);
Kind_Name : constant Text_Type :=
(case Kind is
when Unit_Specification => "specification file",
when Unit_Body => "body file");
Error : constant Text_Type :=
"Could not find source file for " & Name & " (" & Kind_Name
& ")";
begin
Unit := LAL.Analysis_Unit'Class
(Context.Get_With_Error (Dummy_File, Error, Charset));
end;
end if;
end Get_Unit_And_PLE_Root;
-------------
-- Release --
-------------
overriding procedure Release (Provider : in out Project_Unit_Provider) is
begin
case Provider.Data.Kind is
when GPR1_Kind =>
declare
Data : Project_Data renames Provider.Data;
begin
GNAT.Task_Lock.Lock;
if Data.GPR1_Is_Project_Owner then
Prj.Unload (Data.GPR1_Tree.all);
Prj.Free (Data.GPR1_Tree);
Prj.Free (Data.GPR1_Env);
end if;
Data.GPR1_Tree := null;
Data.GPR1_Env := null;
Data.GPR1_Is_Project_Owner := False;
GNAT.Task_Lock.Unlock;
exception
when others =>
GNAT.Task_Lock.Unlock;
raise;
end;
when GPR2_Kind =>
null;
end case;
end Release;
-----------------------------
-- Create_Sorted_Filenames --
-----------------------------
procedure Create_Sorted_Filenames
(File_Set : Filename_Sets.Set;
File_Vector : out Filename_Vectors.Vector)
is
package Sorting is new Filename_Vectors.Generic_Sorting
("<" => US."<");
begin
for F of File_Set loop
-- Normalize the files to return to avoid discrepancies during
-- testing if GPR1 does normalization and GPR2 does not or
-- conversely.
declare
Original : constant String := +F.Full_Name;
Normalized : constant String :=
GNAT.OS_Lib.Normalize_Pathname (Original);
begin
File_Vector.Append (US.To_Unbounded_String (Normalized));
end;
end loop;
Sorting.Sort (File_Vector);
end Create_Sorted_Filenames;
------------------
-- Source_Files --
------------------
function Source_Files
(Tree : Prj.Project_Tree'Class;
Mode : Source_Files_Mode := Default;
Projects : Prj.Project_Array := Prj.Empty_Project_Array)
return Filename_Vectors.Vector
is
use GNATCOLL.Projects;
Result : Filename_Sets.Set;
procedure Include (P : Prj.Project_Type);
-- Include sources that belong to ``P`` (according to ``Mode``) to
-- ``Result``.
procedure Append (F : Virtual_File);
-- If ``F`` is an Ada source in the project tree, append it to
-- ``Result``. This is considered the case if at least one project
-- in the project tree considers this file as an Ada source.
-------------
-- Include --
-------------
procedure Include (P : Prj.Project_Type) is
Recursive : Boolean;
Include_Externally_Built : Boolean;
List : File_Array_Access;
begin
case Mode is
when Default =>
-- Go through all projects except externally built ones
Recursive := True;
Include_Externally_Built := False;
when Root_Project =>
-- Go through ``P`` only, regardless of whether it is
-- externally built.
Recursive := False;
Include_Externally_Built := True;
when Whole_Project | Whole_Project_With_Runtime =>
-- Go through the whole project sub tree
Recursive := True;
Include_Externally_Built := True;
end case;
List := P.Source_Files
(Recursive => Recursive,
Include_Externally_Built => Include_Externally_Built);
for F of List.all loop
Append (F);
end loop;
Unchecked_Free (List);
end Include;
------------
-- Append --
------------
procedure Append (F : Virtual_File) is
FIS : constant File_Info_Set := Tree.Info_Set (F);
-- Compute the set of ``File_Info`` for this file (one for each
-- specific project of the project tree that includes this source).
-- We use ``Tree.Info_Set`` instead of ``Tree.Info`` in order to
-- support the case of aggregate projects. In such case, the set
-- might contain multiple elements (one for each aggregated project
-- that includes this source file): we choose to consider this file
-- an Ada source if any of those projects considers it an Ada source.
--
-- TODO??? We could be more precise by checking that the actual
-- project found in the ``File_Info`` is the one we are currently
-- traversing, but it might actually not be if this source was found
-- as part of a recursive lookup. Besides, it sounds unrealistic for
-- a given source file to be considered an Ada source file in one
-- subproject but, say, a C source file in another. This
-- approximation should be good enough in practice, and will be
-- deprecated anyway once the transition to GPR2 is complete.
begin
for FI of FIS loop
if File_Info (FI).Language = "ada" then
Result.Include (F);
return;
end if;
end loop;
end Append;
begin
-- Include sources from all the requested projects themselves
if Projects'Length = 0 then
Include (Tree.Root_Project);
else
for P of Projects loop
Include (P);
end loop;
end if;
-- Only then, if requested, get runtime sources: they are common to all
-- subprojects.
if Mode = Whole_Project_With_Runtime then
declare
Env : constant Project_Environment_Access :=
Get_Environment (Tree.Root_Project);
begin
for F of Predefined_Source_Files (Env) loop
Append (F);
end loop;
end;
end if;
-- Return the sorted list of source files. Sorting gets the output
-- deterministic and thus helps reproducibility.
return V : Filename_Vectors.Vector do
Create_Sorted_Filenames (Result, V);
end return;
end Source_Files;
------------------
-- Source_Files --
------------------
function Source_Files
(Tree : GPR2.Project.Tree.Object;
Mode : Source_Files_Mode := Default;
Projects : GPR2.Project.View.Set.Object := GPR2.Project.View.Set.Empty)
return Filename_Vectors.Vector
is
-- Note that the GNATCOLL.Projects and GPR2 APIs to query source files
-- are just too different, so creating a common API on top of them is
-- not worth it. For this reason, this GPR2 implementation of
-- Source_Files is completely independent.
Result : Filename_Sets.Set;
procedure Process (View : GPR2.Project.View.Object);
-- Include sources that belong to ``P`` (according to ``Mode``) to
-- ``Result``.
procedure Include (View : GPR2.Project.View.Object);
-- Include in ``Result`` all sources that directly belong to ``P``
-------------
-- Process --
-------------
procedure Process (View : GPR2.Project.View.Object) is
begin
case Mode is
when Default =>
-- Go through all projects except externally built ones
for V of Closure (View) loop
if not V.Is_Externally_Built then
Include (V);
end if;
end loop;
when Root_Project =>
-- Go through ``P`` only, regardless of whether it is
-- externally built.
Include (View);
when Whole_Project | Whole_Project_With_Runtime =>
-- Go through the whole project sub tree
for V of Closure (View) loop
Include (V);
end loop;
end case;
end Process;
-------------
-- Include --
-------------
procedure Include (View : GPR2.Project.View.Object) is
use type GPR2.Language_Id;
begin
for S of View.Sources loop
if S.Language = GPR2.Ada_Language then
Result.Include (Create (+String (S.Path_Name.Value)));
end if;
end loop;
end Include;
begin
-- Include sources from all the requested projects themselves
if Projects.Is_Empty then
Process (Tree.Root_Project);
else
for P of Projects loop
Process (P);
end loop;
end if;
-- Only then, if requested, get runtime sources: they are common to all
-- subprojects.
if Mode = Whole_Project_With_Runtime and then Tree.Has_Runtime_Project
then
Include (Tree.Runtime_Project);
end if;
-- Return the sorted list of source files. Sorting gets the output
-- deterministic and thus helps reproducibility.
return V : Filename_Vectors.Vector do
Create_Sorted_Filenames (Result, V);
end return;
end Source_Files;
-----------------------------------
-- Create_Project_Unit_Providers --
-----------------------------------
function Create_Project_Unit_Providers
(Tree : GPR2.Project.Tree.Object)
return GPR2_Provider_And_Projects_Array_Access
is
Result : Any_Provider_And_Projects_Array_Access :=
Create_Project_Unit_Providers
((Kind => GPR2_Kind, GPR2_Value => Tree.Reference));
begin
-- Convert Result (GPR library agnostic data structure) into the return
-- type (GPR2-specific data structure).
return R : constant GPR2_Provider_And_Projects_Array_Access :=
new GPR2_Provider_And_Projects_Array (Result.all'Range)
do
for I in R.all'Range loop
R (I).Provider := Result (I).Provider;
declare
Projects : View_Vectors.Vector renames Result (I).Projects;
P : GPR2.Project.View.Vector.Object renames
R (I).Projects;
begin
for V of Projects loop
P.Append (V.GPR2_Value);
end loop;
end;
end loop;
Free (Result);
end return;
end Create_Project_Unit_Providers;
----------------------------------
-- Create_Project_Unit_Provider --
----------------------------------
function Create_Project_Unit_Provider
(Tree : GPR2.Project.Tree.Object;
Project : GPR2.Project.View.Object :=
GPR2.Project.View.Undefined)
return LAL.Unit_Provider_Reference
is
Dummy : Project_Unit_Provider_Access;
begin
return Result : LAL.Unit_Provider_Reference do
Create_Project_Unit_Provider
(Tree => (Kind => GPR2_Kind, GPR2_Value => Tree.Reference),
View => (Kind => GPR2_Kind, GPR2_Value => Project),
Provider => Dummy,
Provider_Ref => Result);
end return;
end Create_Project_Unit_Provider;
----------------------------------
-- Default_Charset_From_Project --
----------------------------------
function Default_Charset_From_Project
(Tree : Any_Tree; View : Any_View) return String
is
UTF8 : Boolean := False;
procedure Process_Switch (View : Any_View; Switch : XString);
-- If ``Switch`` is ``-gnatW8``, set ``UTF8`` to True
--------------------
-- Process_Switch --
--------------------
procedure Process_Switch (View : Any_View; Switch : XString) is
pragma Unreferenced (View);
begin
if Switch = "-gnatW8" then
UTF8 := True;
end if;
end Process_Switch;
begin
Iterate_Ada_Compiler_Switches (Tree, View, Process_Switch'Access);
return (if UTF8 then "utf-8" else Default_Charset);
end Default_Charset_From_Project;
----------------------------------
-- Default_Charset_From_Project --
----------------------------------
function Default_Charset_From_Project
(Tree : Prj.Project_Tree'Class;
Project : Prj.Project_Type := Prj.No_Project) return String is
begin
return Default_Charset_From_Project
(Tree => (Kind => GPR1_Kind, GPR1_Value => Tree'Unrestricted_Access),
View => (Kind => GPR1_Kind, GPR1_Value => Project));
end Default_Charset_From_Project;
----------------------------------
-- Default_Charset_From_Project --
----------------------------------
function Default_Charset_From_Project
(Tree : GPR2.Project.Tree.Object;
Project : GPR2.Project.View.Object := GPR2.Project.View.Undefined)
return String is
begin
return Default_Charset_From_Project
(Tree => (Kind => GPR2_Kind, GPR2_Value => Tree'Unrestricted_Access),
View => (Kind => GPR2_Kind, GPR2_Value => Project));
end Default_Charset_From_Project;
end Libadalang.Project_Provider;
|
charlie5/cBound | Ada | 2,688 | 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_change_gc_value_list_t is
-- Item
--
type Item is record
the_function : aliased Interfaces.Unsigned_32;
plane_mask : aliased Interfaces.Unsigned_32;
foreground : aliased Interfaces.Unsigned_32;
background : aliased Interfaces.Unsigned_32;
line_width : aliased Interfaces.Unsigned_32;
line_style : aliased Interfaces.Unsigned_32;
cap_style : aliased Interfaces.Unsigned_32;
join_style : aliased Interfaces.Unsigned_32;
fill_style : aliased Interfaces.Unsigned_32;
fill_rule : aliased Interfaces.Unsigned_32;
tile : aliased xcb.xcb_pixmap_t;
stipple : aliased xcb.xcb_pixmap_t;
tile_stipple_x_origin : aliased Interfaces.Integer_32;
tile_stipple_y_origin : aliased Interfaces.Integer_32;
font : aliased xcb.xcb_font_t;
subwindow_mode : aliased Interfaces.Unsigned_32;
graphics_exposures : aliased xcb.xcb_bool32_t;
clip_x_origin : aliased Interfaces.Integer_32;
clip_y_origin : aliased Interfaces.Integer_32;
clip_mask : aliased xcb.xcb_pixmap_t;
dash_offset : aliased Interfaces.Unsigned_32;
dashes : aliased Interfaces.Unsigned_32;
arc_mode : aliased Interfaces.Unsigned_32;
end record;
-- Item_Array
--
type Item_Array is
array
(Interfaces.C.size_t range <>) of aliased xcb.xcb_change_gc_value_list_t
.Item;
-- Pointer
--
package C_Pointers is new Interfaces.C.Pointers
(Index => Interfaces.C.size_t,
Element => xcb.xcb_change_gc_value_list_t.Item,
Element_Array => xcb.xcb_change_gc_value_list_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_change_gc_value_list_t
.Pointer;
-- Pointer_Pointer
--
package C_Pointer_Pointers is new Interfaces.C.Pointers
(Index => Interfaces.C.size_t,
Element => xcb.xcb_change_gc_value_list_t.Pointer,
Element_Array => xcb.xcb_change_gc_value_list_t.Pointer_Array,
Default_Terminator => null);
subtype Pointer_Pointer is C_Pointer_Pointers.Pointer;
end xcb.xcb_change_gc_value_list_t;
|
Subsets and Splits
No community queries yet
The top public SQL queries from the community will appear here once available.