repo_name
stringlengths 9
74
| language
stringclasses 1
value | length_bytes
int64 11
9.34M
| extension
stringclasses 2
values | content
stringlengths 11
9.34M
|
---|---|---|---|---|
optikos/oasis | Ada | 2,051 | ads | -- Copyright (c) 2019 Maxim Reznik <[email protected]>
--
-- SPDX-License-Identifier: MIT
-- License-Filename: LICENSE
-------------------------------------------------------------
with Program.Elements.Declarations;
with Program.Elements.Defining_Identifiers;
with Program.Lexical_Elements;
with Program.Elements.Expressions;
package Program.Elements.Generalized_Iterator_Specifications is
pragma Pure (Program.Elements.Generalized_Iterator_Specifications);
type Generalized_Iterator_Specification is
limited interface and Program.Elements.Declarations.Declaration;
type Generalized_Iterator_Specification_Access is
access all Generalized_Iterator_Specification'Class
with Storage_Size => 0;
not overriding function Name
(Self : Generalized_Iterator_Specification)
return not null Program.Elements.Defining_Identifiers
.Defining_Identifier_Access is abstract;
not overriding function Iterator_Name
(Self : Generalized_Iterator_Specification)
return not null Program.Elements.Expressions.Expression_Access
is abstract;
not overriding function Has_Reverse
(Self : Generalized_Iterator_Specification)
return Boolean is abstract;
type Generalized_Iterator_Specification_Text is limited interface;
type Generalized_Iterator_Specification_Text_Access is
access all Generalized_Iterator_Specification_Text'Class
with Storage_Size => 0;
not overriding function To_Generalized_Iterator_Specification_Text
(Self : aliased in out Generalized_Iterator_Specification)
return Generalized_Iterator_Specification_Text_Access is abstract;
not overriding function In_Token
(Self : Generalized_Iterator_Specification_Text)
return not null Program.Lexical_Elements.Lexical_Element_Access
is abstract;
not overriding function Reverse_Token
(Self : Generalized_Iterator_Specification_Text)
return Program.Lexical_Elements.Lexical_Element_Access is abstract;
end Program.Elements.Generalized_Iterator_Specifications;
|
reznikmm/matreshka | Ada | 4,041 | ads | ------------------------------------------------------------------------------
-- --
-- Matreshka Project --
-- --
-- Open Document Toolkit --
-- --
-- Runtime Library Component --
-- --
------------------------------------------------------------------------------
-- --
-- Copyright © 2014, Vadim Godunko <[email protected]> --
-- All rights reserved. --
-- --
-- Redistribution and use in source and binary forms, with or without --
-- modification, are permitted provided that the following conditions --
-- are met: --
-- --
-- * Redistributions of source code must retain the above copyright --
-- notice, this list of conditions and the following disclaimer. --
-- --
-- * Redistributions in binary form must reproduce the above copyright --
-- notice, this list of conditions and the following disclaimer in the --
-- documentation and/or other materials provided with the distribution. --
-- --
-- * Neither the name of the Vadim Godunko, IE nor the names of its --
-- contributors may be used to endorse or promote products derived from --
-- this software without specific prior written permission. --
-- --
-- THIS SOFTWARE IS PROVIDED BY THE COPYRIGHT HOLDERS AND CONTRIBUTORS --
-- "AS IS" AND ANY EXPRESS OR IMPLIED WARRANTIES, INCLUDING, BUT NOT --
-- LIMITED TO, THE IMPLIED WARRANTIES OF MERCHANTABILITY AND FITNESS FOR --
-- A PARTICULAR PURPOSE ARE DISCLAIMED. IN NO EVENT SHALL THE COPYRIGHT --
-- HOLDER OR CONTRIBUTORS BE LIABLE FOR ANY DIRECT, INDIRECT, INCIDENTAL, --
-- SPECIAL, EXEMPLARY, OR CONSEQUENTIAL DAMAGES (INCLUDING, BUT NOT LIMITED --
-- TO, PROCUREMENT OF SUBSTITUTE GOODS OR SERVICES; LOSS OF USE, DATA, OR --
-- PROFITS; OR BUSINESS INTERRUPTION) HOWEVER CAUSED AND ON ANY THEORY OF --
-- LIABILITY, WHETHER IN CONTRACT, STRICT LIABILITY, OR TORT (INCLUDING --
-- NEGLIGENCE OR OTHERWISE) ARISING IN ANY WAY OUT OF THE USE OF THIS --
-- SOFTWARE, EVEN IF ADVISED OF THE POSSIBILITY OF SUCH DAMAGE. --
-- --
------------------------------------------------------------------------------
-- $Revision$ $Date$
------------------------------------------------------------------------------
with ODF.DOM.Form_Automatic_Focus_Attributes;
package Matreshka.ODF_Form.Automatic_Focus_Attributes is
type Form_Automatic_Focus_Attribute_Node is
new Matreshka.ODF_Form.Abstract_Form_Attribute_Node
and ODF.DOM.Form_Automatic_Focus_Attributes.ODF_Form_Automatic_Focus_Attribute
with null record;
overriding function Create
(Parameters : not null access Matreshka.DOM_Attributes.Attribute_L2_Parameters)
return Form_Automatic_Focus_Attribute_Node;
overriding function Get_Local_Name
(Self : not null access constant Form_Automatic_Focus_Attribute_Node)
return League.Strings.Universal_String;
end Matreshka.ODF_Form.Automatic_Focus_Attributes;
|
Rodeo-McCabe/orka | Ada | 1,001 | 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.
package body Orka.SIMD.AVX.Singles.Compare is
function Is_True (Elements : m256; Position : Index_Double_Homogeneous) return Boolean is
use type GL.Types.Single;
begin
return Elements (Position) /= 0.0;
exception
when Constraint_Error =>
return True;
end Is_True;
end Orka.SIMD.AVX.Singles.Compare;
|
AaronC98/PlaneSystem | Ada | 36,620 | adb | ------------------------------------------------------------------------------
-- Ada Web Server --
-- --
-- Copyright (C) 2008-2014, AdaCore --
-- --
-- This library is free software; you can redistribute it and/or modify --
-- it under terms of the GNU General Public License as published by the --
-- Free Software Foundation; either version 3, or (at your option) any --
-- later version. This library is distributed in the hope that it will be --
-- useful, but WITHOUT ANY WARRANTY; without even the implied warranty of --
-- MERCHANTABILITY or FITNESS FOR A PARTICULAR PURPOSE. --
-- --
-- --
-- --
-- --
-- --
-- You should have received a copy of the GNU General Public License and --
-- a copy of the GCC Runtime Library Exception along with this program; --
-- see the files COPYING3 and COPYING.RUNTIME respectively. If not, see --
-- <http://www.gnu.org/licenses/>. --
-- --
-- --
-- --
-- --
-- --
-- --
-- --
------------------------------------------------------------------------------
with Ada.Characters.Handling;
with Ada.Containers.Indefinite_Ordered_Maps;
with Ada.Exceptions;
with Ada.Strings.Fixed;
with Ada.Text_IO;
with Ada.Unchecked_Deallocation;
with Input_Sources.Strings;
with Sax.Attributes;
with Sax.Readers;
with Unicode.CES.Basic_8bit;
with AWS.Jabber.Digest_Md5;
with AWS.Translator;
with AWS.Utils;
package body AWS.Jabber.Client is
use Ada;
procedure XMPP_Send (Account : Client.Account; Message : String);
-- Send a XMPP message to the jabber server
function Image (Serial : Serial_Number) return String
with Post => Image'Result (Image'Result'First) = '_';
-- Returns string representation of Serial with '_' as prefix
-----------
-- Close --
-----------
procedure Close (Account : in out Client.Account) is
procedure Unchecked_Free is new Ada.Unchecked_Deallocation
(Incoming_Stream, Incoming_Stream_Access);
procedure Unchecked_Free is new Ada.Unchecked_Deallocation
(Serial_Generator, Serial_Generator_Access);
begin
if Account.Is_Running then
-- Let's annouce that we are going offline
XMPP_Send (Account,
"<presence type='unavailable' from='"
& To_String (Account.User.JID) & "'/>");
-- Send closing stream element
XMPP_Send (Account, "</stream:stream>");
Net.Shutdown (Account.Sock.all);
-- Terminate task Incoming_Stream
while not Account.Stream'Terminated loop
delay 1.0;
end loop;
Net.Free (Account.Sock);
Unchecked_Free (Account.Stream);
Account.Is_Running := False;
Unchecked_Free (Account.Serial);
end if;
end Close;
-------------
-- Connect --
-------------
procedure Connect (Account : in out Client.Account) is
begin
-- Open socket to Jabber Server
Account.Sock := Net.Socket (Security => False);
Connection : begin
Net.Connect
(Account.Sock.all,
To_String (Account.Host), Positive (Account.Port));
exception
when Net.Socket_Error =>
raise Server_Error with "Can't connect to "
& To_String (Account.Host)
& ':' & Utils.Image (Positive (Account.Port));
end Connection;
-- Initialize the Jabber protocol
XMPP_Send
(Account,
"<?xml version='1.0' encoding='UTF-8' ?>"
& "<stream:stream to=" & Utils.Quote (To_String (Account.Host))
& " xmlns='jabber:client'"
& " xmlns:stream='http://etherx.jabber.org/streams' version='1.0'>");
-- Start Incoming_Stream reader
Account.Stream := new Incoming_Stream (Account.Self);
Account.Is_Running := True;
exception
when E : others =>
Text_IO.Put_Line (Exceptions.Exception_Information (E));
-- We must close the server properly before leaving this routine if
-- an exception is raised.
Close (Account);
raise Server_Error;
end Connect;
---------------
-- Get_User ---
---------------
function Get_User
(Account : Client.Account) return String is
begin
return To_String (Account.User.Name);
end Get_User;
-----------
-- Image --
-----------
function Image (Serial : Serial_Number) return String is
Result : String := Serial_Number'Image (Serial);
begin
Result (Result'First) := '_';
return Result;
end Image;
-----------------
-- IO_Message ---
-----------------
procedure IO_Message
(Account : Account_Access;
From : Jabber_ID;
Message_Type : Client.Message_Type;
Subject : String;
Content : String)
is
pragma Unreferenced (Account);
begin
Text_IO.Put_Line ("From :" & String (From));
if Message_Type = M_Normal then
Text_IO.Put_Line ("Subject: " & Subject);
end if;
Text_IO.Put_Line ("Body: " & Content);
end IO_Message;
-----------------
-- IO_Presence --
-----------------
procedure IO_Presence
(Account : Account_Access;
From : Jabber_ID;
Status : String)
is
pragma Unreferenced (Account);
begin
Text_IO.Put_Line (String (From) & " is " & Status);
end IO_Presence;
----------------------------
-- Remove_And_Unsubscribe --
----------------------------
procedure Remove_And_Unsubscribe
(Account : Client.Account;
JID : Jabber_ID)
is
Serial : Serial_Number;
begin
Account.Serial.Get (Serial);
XMPP_Send (Account, "<iq type='set' id='remove" & Image (Serial) & "'>"
& " <query xmlns='jabber:iq:roster'>"
& " <item jid='" & String (JID) & "'"
& " subscription='remove'/>"
& " </query></iq>");
end Remove_And_Unsubscribe;
----------
-- Send --
----------
procedure Send
(Account : Client.Account;
JID : Jabber_ID;
Content : String;
Subject : String := "";
Message_Type : Client.Message_Type := M_Normal)
is
function Send_Type return String;
-- Returns the message type
---------------
-- Send_Type --
---------------
function Send_Type return String is
T : constant String := Client.Message_Type'Image (Message_Type);
begin
return Characters.Handling.To_Lower (T (T'First + 2 .. T'Last));
end Send_Type;
Serial : Serial_Number;
Result : Ada.Strings.Unbounded.Unbounded_String;
begin
if Account.Is_Running then
Account.Serial.Get (Serial);
-- Send Message
Ada.Strings.Unbounded.Append
(Result, "<message type='" & Send_Type & "'"
& " id='msg" & Image (Serial)
& "' to='" & String (JID) & "'>");
if Subject /= "" then
Ada.Strings.Unbounded.Append
(Result,
" <subject>" & Subject & "</subject>");
end if;
Ada.Strings.Unbounded.Append
(Result,
" <body>" & Content & "</body></message>");
XMPP_Send (Account, To_String (Result));
else
raise Server_Error with "Not connected to server";
end if;
end Send;
-----------------------------
-- Set_Authentication_Type --
-----------------------------
procedure Set_Authentication_Type
(Account : in out Client.Account;
Auth_Type : Authentication_Mechanism) is
begin
Account.Auth_Type := Auth_Type;
end Set_Authentication_Type;
--------------
-- Set_Host --
--------------
procedure Set_Host
(Account : in out Client.Account;
Host : String) is
begin
Account.Host := To_Unbounded_String (Host);
end Set_Host;
---------------------------
-- Set_Login_Information --
---------------------------
procedure Set_Login_Information
(Account : in out Client.Account;
User : String;
Password : String;
Resource : String := "") is
begin
Account.User.Name := To_Unbounded_String (User);
Account.User.Password := To_Unbounded_String (Password);
Account.User.Resource := To_Unbounded_String (Resource);
end Set_Login_Information;
----------------------
-- Set_Message_Hook --
----------------------
procedure Set_Message_Hook
(Account : in out Client.Account;
Hook : Message_Hook) is
begin
Account.Hooks.Message := Hook;
end Set_Message_Hook;
--------------
-- Set_Port --
--------------
procedure Set_Port
(Account : in out Client.Account;
Port : Client.Port) is
begin
Account.Port := Port;
end Set_Port;
-----------------------
-- Set_Presence_Hook --
-----------------------
procedure Set_Presence_Hook
(Account : in out Client.Account;
Hook : Presence_Hook) is
begin
Account.Hooks.Presence := Hook;
end Set_Presence_Hook;
---------------
-- Subscribe --
---------------
procedure Subscribe
(Account : Client.Account;
JID : Jabber_ID) is
begin
XMPP_Send
(Account, "<presence to='" & String (JID) & "' type='subscribe'/>");
end Subscribe;
------------------
-- To_Jabber_ID --
------------------
function To_Jabber_ID
(Username : String;
Server : String;
Resource : String := "") return Jabber_ID is
begin
if Resource /= "" then
return Jabber_ID (Username & '@' & Server & '/' & Resource);
else
return Jabber_ID (Username & '@' & Server);
end if;
end To_Jabber_ID;
---------------------
-- Incoming_Stream --
---------------------
task body Incoming_Stream is
type Connection_Step is
(Initialize_Connection, Get_Mechanism, Authentication, Connected);
type Authentication_Step is
(First_Challenge, Second_Challenge, Challenge_Result,
Bind_Requirement, Get_Resource, Get_Ack_Session);
Connection_Current_Step : Connection_Step := Initialize_Connection;
Authentication_Current_Step : Authentication_Step := First_Challenge;
procedure Get_Message (XML : String; Start, Stop : in out Positive);
-- Returns Start and Stop where XML (Start .. Stop) is the next XML
-- chunk. Start and Stop are initialy set as bound for the previous
-- slice. The first time this routine is called we have
-- Start = Stop = XML'First. Returns Start = Stop if this tag must be
-- skipped and Start > XML'Last when there is nothing more to read.
procedure Parse_Message (XML : String);
-- Parse the XML message and call the appropriate hooks
-----------------
-- Get_Message --
-----------------
procedure Get_Message (XML : String; Start, Stop : in out Positive) is
K : Positive;
I : Natural;
begin
if Start /= Stop or else Start /= XML'First then
Start := Stop + 1;
end if;
if Start > XML'Last then
return;
end if;
-- Look for start tag
while Start <= XML'Last and then XML (Start) /= '<' loop
Start := Start + 1;
end loop;
K := Start + 1;
while K <= XML'Last and then XML (K) /= ' ' loop
K := K + 1;
end loop;
K := K - 1;
-- Look for the end of the current tag
Stop := Start;
while Stop <= XML'Last and then XML (Stop) /= '>' loop
Stop := Stop + 1;
end loop;
if Start > XML'Last or else Stop > XML'Last then
-- We have reached the end of the string
-- Nothing more to read
Start := XML'Last + 1;
return;
end if;
-- Check for tag to be skipped
if XML (Start .. K) = "<?xml" then
Stop := Start;
Start := Stop + 1;
return;
end if;
if XML (Start .. K) = "<stream:stream" then
-- There is no ending element, this tag will be closed when the
-- server will close the connection.
return;
end if;
-- Look now for the ending element
I := Strings.Fixed.Index
(XML (Start .. XML'Last), "</" & XML (Start + 1 .. K) & '>');
if I = 0 then
-- No ending element tag, look for "/>"
I := Strings.Fixed.Index (XML (Start .. XML'Last), "/>");
if I = 0 then
Start := XML'Last + 1;
Stop := Start;
else
Stop := I + 1;
end if;
else
Stop := I + K - Start + 2;
end if;
end Get_Message;
-------------------
-- Parse_Message --
-------------------
procedure Parse_Message (XML : String) is
use Input_Sources.Strings;
package XMPP_Parser is
package Messages_Maps is
new Ada.Containers.Indefinite_Ordered_Maps (String, String);
type XMPP_Message is new Messages_Maps.Map with null record;
-- A XMPP_Message, this is just a set of key/value pair. Each key
-- represent a tag and the associated value is the tag's value.
-- Tag's attributes are encoded with a key which is the tag
-- element name catenated with a '.' and the attribute name. For
-- example with :
--
-- <presence from="toto"/>
--
-- We have : Key Value
-- ------------- ------
-- presence ""
-- presence.from "toto"
type XMPP_Message_Access is access all XMPP_Message;
procedure Unchecked_Free is new Ada.Unchecked_Deallocation
(XMPP_Message, XMPP_Message_Access);
-- Release all maemory associated with the response object_access
type Tree_Reader is new Sax.Readers.Reader with record
R : XMPP_Message_Access;
Key : Unbounded_String;
Value : Unbounded_String;
end record;
overriding procedure Start_Element
(Handler : in out Tree_Reader;
Namespace_URI : Unicode.CES.Byte_Sequence := "";
Local_Name : Unicode.CES.Byte_Sequence := "";
Qname : Unicode.CES.Byte_Sequence := "";
Atts : Sax.Attributes.Attributes'Class);
overriding procedure End_Element
(Handler : in out Tree_Reader;
Namespace_URI : Unicode.CES.Byte_Sequence := "";
Local_Name : Unicode.CES.Byte_Sequence := "";
Qname : Unicode.CES.Byte_Sequence := "");
overriding procedure Characters
(Handler : in out Tree_Reader;
Ch : Unicode.CES.Byte_Sequence);
overriding procedure Ignorable_Whitespace
(Handler : in out Tree_Reader;
Ch : Unicode.CES.Byte_Sequence);
procedure Process
(Account : in out Client.Account;
Message : XMPP_Message_Access);
end XMPP_Parser;
function Message_Suffix return String;
-- Returns the closing stream tag to be able to parse the
-- stream:stream element. This element will be closed when the
-- Jabber session will be terminated. We just add this here to be
-- able to parse this XML message.
--------------------
-- Message_Suffix --
--------------------
function Message_Suffix return String is
begin
if XML (XML'First .. XML'First + 13) = "<stream:stream" then
return "</stream:stream>";
elsif XML (XML'First .. XML'First + 15) = "<stream:features" then
return "</stream:features>";
else
return "";
end if;
end Message_Suffix;
-----------------
-- XMPP_Parser --
-----------------
package body XMPP_Parser is
----------------
-- Characters --
----------------
overriding procedure Characters
(Handler : in out Tree_Reader;
Ch : Unicode.CES.Byte_Sequence) is
begin
Append (Handler.Value, To_Unbounded_String (Ch));
end Characters;
-----------------
-- End_Element --
-----------------
overriding procedure End_Element
(Handler : in out Tree_Reader;
Namespace_URI : Unicode.CES.Byte_Sequence := "";
Local_Name : Unicode.CES.Byte_Sequence := "";
Qname : Unicode.CES.Byte_Sequence := "")
is
pragma Unreferenced (Namespace_URI);
pragma Unreferenced (Local_Name);
pragma Unreferenced (Qname);
Cursor : Messages_Maps.Cursor;
Found : Boolean;
begin
if Handler.Key /= Null_Unbounded_String then
if not Contains
(Handler.R.all, To_String (Handler.Key))
then
Insert
(Handler.R.all, To_String (Handler.Key),
To_String (Handler.Value), Cursor, Found);
else
-- Set the key value to old_value:new_value
Replace (Handler.R.all, To_String (Handler.Key),
Element (Handler.R.all, To_String (Handler.Key))
& ':' & To_String (Handler.Value));
end if;
end if;
Handler.Key := Null_Unbounded_String;
Handler.Value := Null_Unbounded_String;
end End_Element;
--------------------------
-- Ignorable_Whitespace --
--------------------------
overriding procedure Ignorable_Whitespace
(Handler : in out Tree_Reader;
Ch : Unicode.CES.Byte_Sequence) is
begin
Append (Handler.Value, Ch);
end Ignorable_Whitespace;
-------------
-- Process --
-------------
procedure Process
(Account : in out Client.Account;
Message : XMPP_Message_Access)
is
procedure Digest_MD5_Authenticate;
function Value
(M : XMPP_Message_Access;
Key : String) return String;
-- Returns the value for Key in the message M
-- or The empty string if the key is not found.
procedure Get_Presence_Hook;
-- Get the presence status and run the presence hook
procedure Get_Message_Hook;
-- Run the message hook
-----------------------------
-- Digest_MD5_Authenticate --
-----------------------------
procedure Digest_MD5_Authenticate is
procedure Next_Step;
-- Move Digest_MD5_Current_Step to next step
---------------
-- Next_Step --
---------------
procedure Next_Step is
begin
Authentication_Current_Step :=
Authentication_Step'Succ (Authentication_Current_Step);
end Next_Step;
Serial : Serial_Number;
begin
if Authentication_Current_Step = First_Challenge
and then Contains (Message.all, "challenge")
then
Reply_Challenge : declare
Challenge : constant Digest_Md5.Challenge :=
Digest_Md5.Decode_Challenge
(Value (Message, "challenge"));
begin
XMPP_Send
(Account,
"<response "
& "xmlns='urn:ietf:params:xml:ns:xmpp-sasl'>"
& Digest_Md5.Reply_Challenge
(Username => To_String (Account.User.Name),
Realm => To_String (Challenge.Realm),
Password => To_String (Account.User.Password),
Host => To_String (Account.Host),
Nonce => To_String (Challenge.Nonce))
& "</response>");
end Reply_Challenge;
Next_Step;
elsif Authentication_Current_Step = Second_Challenge
and then Contains (Message.all, "challenge")
then
-- If the authentication succeed, the server will send a
-- final challenge that contain a single directive
-- "rspauth" base64 encoded. This directive is ignored.
-- Simply return an empty response
XMPP_Send
(Account,
"<response "
& "xmlns='urn:ietf:params:xml:ns:xmpp-sasl'/>");
Next_Step;
elsif Authentication_Current_Step = Challenge_Result
and then Contains (Message.all, "success")
then
-- At this point, the server inform the client
-- of successful authentication, with:
-- <success xmlns='urn:ietf:params:xml:ns:xmpp-sasl'/>
-- Start a new stream
XMPP_Send
(Account,
"<stream:stream "
& "xmlns:stream='http://etherx.jabber.org/streams' "
& "xmlns='jabber:client' "
& "to='" & To_String (Account.Host) & "' "
& "version='1.0'>");
Next_Step;
elsif Authentication_Current_Step = Bind_Requirement
and then Contains (Message.all, "bind")
then
Account.Serial.Get (Serial);
-- Server tells client that resource binding is required
-- Request a resource or ask for the desired resource
if Account.User.Resource /= "" then
XMPP_Send
(Account,
"<iq type='set' id='bind" & Image (Serial) & "'>"
& "<bind xmlns='urn:ietf:params:xml:ns:xmpp-bind'>"
& "<resource>"
& To_String (Account.User.Resource)
& "</resource></bind></iq>");
else
XMPP_Send
(Account,
"<iq type='set' id='bind" & Image (Serial) & "'>"
& "<bind xmlns='urn:ietf:params:xml:ns:xmpp-bind'/>"
& "</iq>");
end if;
Next_Step;
elsif Authentication_Current_Step = Get_Resource
and then Contains (Message.all, "jid")
then
Account.Serial.Get (Serial);
Account.User.JID := To_Unbounded_String
(Value (Message, "jid"));
-- Server sent the generated (or requested) resource
-- The client must now request an IM session
XMPP_Send
(Account,
"<iq type='set' id='sess" & Image (Serial) & "'>"
& "<session "
& "xmlns='urn:ietf:params:xml:ns:xmpp-session'/>"
& "</iq>");
Next_Step;
elsif Authentication_Current_Step = Get_Ack_Session
and then Contains (Message.all, "session")
then
Account.Serial.Get (Serial);
-- Send our presence, as this is an application and not a
-- real user we send an initial dnd (Do Not Disturb)
-- status.
XMPP_Send (Account,
"<presence from='" & To_String (Account.User.JID)
& "' id='ja_pres" & Image (Serial) & "'>"
& "<show>dnd</show>"
& "<status>AWS Project</status>"
& "</presence>");
Connection_Current_Step := Connected;
end if;
end Digest_MD5_Authenticate;
----------------------
-- Get_Message_Hook --
----------------------
procedure Get_Message_Hook is
Type_Value : constant String :=
Value (Message, "message.type");
Get_Type : Message_Type := M_Normal;
begin
if Type_Value = "chat" then
Get_Type := M_Chat;
elsif Type_Value = "normal" then
Get_Type := M_Normal;
elsif Type_Value = "groupchat" then
Get_Type := M_Group_Chat;
elsif Type_Value = "headline" then
Get_Type := M_Headline;
elsif Type_Value = "error" then
Get_Type := M_Error;
end if;
Account.Hooks.Message
(Account => Account.Self,
From => Jabber_ID
(Value (Message, "message.from")),
Message_Type => Get_Type,
Subject => Value (Message, "subject"),
Content => Value (Message, "body"));
end Get_Message_Hook;
-----------------------
-- Get_Presence_Hook --
-----------------------
procedure Get_Presence_Hook is
function Get_Status return String;
-- Returns the presence status
----------------
-- Get_Status --
----------------
function Get_Status return String is
Presence_Type : constant String :=
Value (Message, "presence.type");
begin
if Presence_Type = "error" then
return Presence_Type;
else
if Message.Contains ("presence.show") then
return Value (Message, "presence.show");
else
-- Default is online
return "Online";
end if;
end if;
end Get_Status;
begin
Account.Hooks.Presence
(Account => Account.Self,
From => Jabber_ID (Value (Message, "presence.from")),
Status => Get_Status);
end Get_Presence_Hook;
-----------
-- Value --
-----------
function Value
(M : XMPP_Message_Access;
Key : String) return String
is
Cursor : Messages_Maps.Cursor;
begin
Cursor := Find (M.all, Key);
if Messages_Maps.Has_Element (Cursor) then
return Element (M.all, Key);
else
return "";
end if;
end Value;
begin
if Connection_Current_Step = Initialize_Connection then
-- Get Session Id from the stream element
Account.SID := To_Unbounded_String
(Value (Message, "stream.id"));
Connection_Current_Step :=
Connection_Step'Succ (Connection_Current_Step);
elsif Connection_Current_Step = Get_Mechanism
and then Message.Contains ("mechanism")
then
Check_Mecanism : declare
Supported_Mechanism : constant String :=
Value (Message, "mechanism");
begin
if (Account.Auth_Type = More_Secure_Mechanism
or else Account.Auth_Type = Digest_Md5_Mechanism)
and then Strings.Fixed.Index
(Supported_Mechanism, "DIGEST-MD5") /= 0
then
XMPP_Send
(Account,
"<auth xmlns='urn:ietf:params:xml:ns:xmpp-sasl' "
& "mechanism='DIGEST-MD5'/>");
elsif (Account.Auth_Type = More_Secure_Mechanism
or else Account.Auth_Type = Plain_Mechanism)
and then Strings.Fixed.Index
(Supported_Mechanism, "PLAIN") /= 0
then
XMPP_Send
(Account,
"<auth xmlns='urn:ietf:params:xml:ns:xmpp-sasl' "
& "mechanism='PLAIN'>"
& AWS.Translator.Base64_Encode
(ASCII.NUL & To_String (Account.User.Name)
& ASCII.NUL & To_String (Account.User.Password))
& "</auth>");
-- Go directly to challenge result step
Authentication_Current_Step := Challenge_Result;
else
raise Server_Error
with "Mechanism is not supported by server";
end if;
end Check_Mecanism;
Connection_Current_Step :=
Connection_Step'Succ (Connection_Current_Step);
elsif Connection_Current_Step = Authentication then
Digest_MD5_Authenticate;
elsif Connection_Current_Step = Connected then
if Message.Contains ("presence.from") then
Get_Presence_Hook;
elsif Message.Contains ("message.from") then
Get_Message_Hook;
end if;
end if;
end Process;
-------------------
-- Start_Element --
-------------------
overriding procedure Start_Element
(Handler : in out Tree_Reader;
Namespace_URI : Unicode.CES.Byte_Sequence := "";
Local_Name : Unicode.CES.Byte_Sequence := "";
Qname : Unicode.CES.Byte_Sequence := "";
Atts : Sax.Attributes.Attributes'Class)
is
pragma Unreferenced (Namespace_URI);
pragma Unreferenced (Qname);
use Sax.Attributes;
Cursor : Messages_Maps.Cursor;
Found : Boolean;
begin
Handler.Key := To_Unbounded_String (Local_Name);
-- Read all attributes, add a key/value pair for each atributes
-- into the table with [Local_Name & '.'] added in from of the
-- key (attribute name)
for J in 0 .. Get_Length (Atts) - 1 loop
declare
Key : constant String :=
Local_Name & '.' & Get_Qname (Atts, J);
begin
if not Contains (Handler.R.all, Key) then
Insert
(Handler.R.all,
Key,
Get_Value (Atts, J),
Cursor, Found);
end if;
end;
end loop;
end Start_Element;
end XMPP_Parser;
XML_Message : aliased String := "<stream:stream xmlns='jabber:client'"
& " xmlns:stream='http://etherx.jabber.org/streams' version='1.0'>"
& XML & Message_Suffix & "</stream:stream>";
Source : String_Input;
Reader : XMPP_Parser.Tree_Reader;
begin
Reader.R := new XMPP_Parser.XMPP_Message;
-- Parse the XML message
Open (XML_Message'Unchecked_Access,
Unicode.CES.Basic_8bit.Basic_8bit_Encoding,
Source);
-- If True, xmlns:* attributes will be reported in Start_Element
XMPP_Parser.Set_Feature
(Reader, Sax.Readers.Namespace_Prefixes_Feature, False);
XMPP_Parser.Set_Feature
(Reader, Sax.Readers.Validation_Feature, False);
XMPP_Parser.Parse (Reader, Source);
Close (Source);
-- Add message into the Mailbox
XMPP_Parser.Process (Account.all, Reader.R);
XMPP_Parser.Unchecked_Free (Reader.R);
end Parse_Message;
begin
loop
declare
XML_Response : constant String :=
Translator.To_String (Account.Sock.Receive);
Start, Stop : Positive := XML_Response'First;
begin
loop
Get_Message (XML_Response, Start, Stop);
exit when Start > XML_Response'Last;
if Start < Stop then
Parse_Message (XML_Response (Start .. Stop));
end if;
end loop;
end;
end loop;
exception
when Net.Socket_Error =>
-- We have been disconnected, this is the way Jabber terminate the
-- session.
null;
when E : others =>
Text_IO.Put_Line (Exceptions.Exception_Information (E));
raise;
end Incoming_Stream;
----------------------
-- Serial_Generator --
----------------------
protected body Serial_Generator is
procedure Get (Serial : out Serial_Number) is
begin
Value := Value + 1;
Serial := Value;
end Get;
end Serial_Generator;
---------------
-- XMPP_Send --
---------------
procedure XMPP_Send (Account : Client.Account; Message : String) is
begin
Account.Sock.Send
(Translator.To_Stream_Element_Array (Message & ASCII.CR & ASCII.LF));
end XMPP_Send;
end AWS.Jabber.Client;
|
zhmu/ananas | Ada | 534 | adb | -- { dg-do compile }
-- { dg-options "-O" }
with System, Ada.Unchecked_Conversion;
with System.Storage_Elements; use System.Storage_Elements;
procedure Loop_Address2 is
type Ptr is access all Integer;
function To_Ptr is new Ada.Unchecked_Conversion (System.Address, Ptr);
function F (BM : System.Address; I : Integer) return System.Address is
begin
return BM + Storage_Offset (4*I);
end;
B : Integer;
P : Ptr;
begin
for I in 0 .. 2 loop
P := To_Ptr (F (B'Address, I));
P.all := 0;
end loop;
end ;
|
faelys/natools | Ada | 7,348 | adb | ------------------------------------------------------------------------------
-- Copyright (c) 2013, Natacha Porté --
-- --
-- Permission to use, copy, modify, and distribute this software for any --
-- purpose with or without fee is hereby granted, provided that the above --
-- copyright notice and this permission notice appear in all copies. --
-- --
-- THE SOFTWARE IS PROVIDED "AS IS" AND THE AUTHOR DISCLAIMS ALL WARRANTIES --
-- WITH REGARD TO THIS SOFTWARE INCLUDING ALL IMPLIED WARRANTIES OF --
-- MERCHANTABILITY AND FITNESS. IN NO EVENT SHALL THE AUTHOR BE LIABLE FOR --
-- ANY SPECIAL, DIRECT, INDIRECT, OR CONSEQUENTIAL DAMAGES OR ANY DAMAGES --
-- WHATSOEVER RESULTING FROM LOSS OF USE, DATA OR PROFITS, WHETHER IN AN --
-- ACTION OF CONTRACT, NEGLIGENCE OR OTHER TORTIOUS ACTION, ARISING OUT OF --
-- OR IN CONNECTION WITH THE USE OR PERFORMANCE OF THIS SOFTWARE. --
------------------------------------------------------------------------------
package body Natools.Accumulators.Tests is
package NT renames Natools.Tests;
procedure Check_Emptiness
(Report : in out NT.Reporter'Class;
Accumulator : in out String_Accumulator'Class;
Test_Name : in String);
-- Add an item to Report, success being emptiness of Accumulator
procedure Check_Contents
(Report : in out NT.Reporter'Class;
Accumulator : in out String_Accumulator'Class;
Test_Name : in String;
Reference : in String);
-- Add an item to Report, success being Accumulator matching Reference
procedure Check_Contents
(Report : in out NT.Reporter'Class;
Accumulator : in out String_Accumulator'Class;
Test_Name : in String;
Reference : in String)
is
S : constant String := Accumulator.To_String;
L : constant Natural := Accumulator.Length;
begin
if S'Length /= L then
NT.Item (Report, Test_Name, NT.Fail);
NT.Info
(Report,
"Inconsistent length" & Natural'Image (L)
& " for string """ & S & '"');
elsif S /= Reference then
NT.Item (Report, Test_Name, NT.Fail);
NT.Info (Report, "Accumulated """ & S & '"');
NT.Info (Report, "Reference """ & Reference & '"');
else
NT.Item (Report, Test_Name, NT.Success);
end if;
end Check_Contents;
procedure Check_Emptiness
(Report : in out NT.Reporter'Class;
Accumulator : in out String_Accumulator'Class;
Test_Name : in String)
is
L : constant Natural := Accumulator.Length;
S : constant String := Accumulator.To_String;
begin
if L /= 0 or S /= "" then
NT.Item (Report, Test_Name, NT.Fail);
NT.Info (Report, "Accumulator.Length is" & Natural'Image (L));
NT.Info (Report, "Accumulator.To_String is """ & S & '"');
else
NT.Item (Report, Test_Name, NT.Success);
end if;
end Check_Emptiness;
procedure Test
(Report : in out Natools.Tests.Reporter'Class;
Accumulator : in out String_Accumulator'Class)
is
Part_1 : constant String
:= "The quick brown fox jumps over the lazy dog.";
Part_2 : constant String
:= "Lorem ipsum dolor sit amet, consectetur adipisicing elit.";
L_1 : constant Natural := 10;
L_2 : constant Natural := 7;
begin
declare
Name : constant String := "Soft_Reset";
begin
Accumulator.Soft_Reset;
Check_Emptiness (Report, Accumulator, Name);
exception
when Error : others => NT.Report_Exception (Report, Name, Error);
end;
declare
Name : constant String := "String append";
begin
Accumulator.Append (Part_1);
Check_Contents (Report, Accumulator, Name, Part_1);
exception
when Error : others => NT.Report_Exception (Report, Name, Error);
end;
declare
Name : constant String := "Character accumulation";
begin
for I in Part_2'Range loop
Accumulator.Append (String'(1 => Part_2 (I)));
end loop;
Check_Contents (Report, Accumulator, Name, Part_1 & Part_2);
exception
when Error : others => NT.Report_Exception (Report, Name, Error);
end;
declare
Name : constant String := "Tail extraction";
OK : Boolean := True;
begin
declare
T : constant String := Accumulator.Tail (L_1);
begin
if T'Length /= L_1 then
NT.Item (Report, Name, NT.Fail);
NT.Info (Report,
"Wrong tail length" & Natural'Image (T'Length)
& ", expected" & Natural'Image (L_1));
OK := False;
elsif T /= Part_2 (Part_2'Last - L_1 + 1 .. Part_2'Last) then
NT.Item (Report, Name, NT.Fail);
NT.Info (Report, "Incorrect tail """ & T & '"');
NT.Info (Report, "Expected """
& Part_2 (Part_2'Last - L_1 + 1 .. Part_2'Last) & '"');
OK := False;
end if;
end;
if OK then
Check_Contents (Report, Accumulator, Name, Part_1 & Part_2);
end if;
exception
when Error : others => NT.Report_Exception (Report, Name, Error);
end;
declare
Name : constant String := "Unappend";
begin
Accumulator.Unappend (Part_2 (Part_2'Last - L_2 + 1 .. Part_2'Last));
Check_Contents (Report, Accumulator, Name,
Part_1 & Part_2 (Part_2'First .. Part_2'Last - L_2));
exception
when Error : others => NT.Report_Exception (Report, Name, Error);
end;
declare
Name : constant String := "No-op Unappend";
begin
Accumulator.Unappend (Part_1);
Check_Contents (Report, Accumulator, Name,
Part_1 & Part_2 (Part_2'First .. Part_2'Last - L_2));
exception
when Error : others => NT.Report_Exception (Report, Name, Error);
end;
declare
Name : constant String := "In-place To_String";
Target : String (1 .. Part_1'Length + Part_2'Length)
:= (others => '*');
begin
Accumulator.To_String (Target);
Target (Part_1'Length + Part_2'Length - L_2 + 1 .. Target'Last)
:= Part_2 (Part_2'Last - L_2 + 1 .. Part_2'Last);
if Target /= Part_1 & Part_2 then
NT.Item (Report, Name, NT.Fail);
NT.Info (Report, "Found """ & Target & '"');
NT.Info (Report, "Expected """ & Target & '"');
else
Check_Contents (Report, Accumulator, Name,
Part_1 & Part_2 (Part_2'First .. Part_2'Last - L_2));
end if;
exception
when Error : others => NT.Report_Exception (Report, Name, Error);
end;
declare
Name : constant String := "Hard_Reset";
begin
Accumulator.Hard_Reset;
Check_Emptiness (Report, Accumulator, Name);
exception
when Error : others => NT.Report_Exception (Report, Name, Error);
end;
end Test;
end Natools.Accumulators.Tests;
|
AdaCore/gpr | Ada | 117 | ads | generic
type Item is private;
package Gen2 is
procedure Push (X : Item);
function Pop return Item;
end Gen2; |
AdaCore/libadalang | Ada | 618 | adb | procedure ats_types is
type T1 is access procedure (X : Integer) with Pre => X mod 2 = 0;
pragma Test_Block;
type T2 is access procedure (X : Integer) with Post => X mod 2 = 0;
pragma Test_Block;
-- NOTE: nameres gives a wrong result for My_Size in the Pre aspect below.
-- It should refer to My_Size from the parameter specification but it refers
-- to the number declaration instead. See TN V513-007.
My_Size : constant := 64;
type An_Acc_Sub is access procedure (My_Size : Natural)
with Size => My_Size, Pre => My_Size mod 64 = 0;
pragma Test_Block;
begin
null;
end ats_types;
|
reznikmm/matreshka | Ada | 4,361 | adb | ------------------------------------------------------------------------------
-- --
-- Matreshka Project --
-- --
-- Web Framework --
-- --
-- Runtime Library Component --
-- --
------------------------------------------------------------------------------
-- --
-- Copyright © 2016-2017, Vadim Godunko <[email protected]> --
-- All rights reserved. --
-- --
-- Redistribution and use in source and binary forms, with or without --
-- modification, are permitted provided that the following conditions --
-- are met: --
-- --
-- * Redistributions of source code must retain the above copyright --
-- notice, this list of conditions and the following disclaimer. --
-- --
-- * Redistributions in binary form must reproduce the above copyright --
-- notice, this list of conditions and the following disclaimer in the --
-- documentation and/or other materials provided with the distribution. --
-- --
-- * Neither the name of the Vadim Godunko, IE nor the names of its --
-- contributors may be used to endorse or promote products derived from --
-- this software without specific prior written permission. --
-- --
-- THIS SOFTWARE IS PROVIDED BY THE COPYRIGHT HOLDERS AND CONTRIBUTORS --
-- "AS IS" AND ANY EXPRESS OR IMPLIED WARRANTIES, INCLUDING, BUT NOT --
-- LIMITED TO, THE IMPLIED WARRANTIES OF MERCHANTABILITY AND FITNESS FOR --
-- A PARTICULAR PURPOSE ARE DISCLAIMED. IN NO EVENT SHALL THE COPYRIGHT --
-- HOLDER OR CONTRIBUTORS BE LIABLE FOR ANY DIRECT, INDIRECT, INCIDENTAL, --
-- SPECIAL, EXEMPLARY, OR CONSEQUENTIAL DAMAGES (INCLUDING, BUT NOT LIMITED --
-- TO, PROCUREMENT OF SUBSTITUTE GOODS OR SERVICES; LOSS OF USE, DATA, OR --
-- PROFITS; OR BUSINESS INTERRUPTION) HOWEVER CAUSED AND ON ANY THEORY OF --
-- LIABILITY, WHETHER IN CONTRACT, STRICT LIABILITY, OR TORT (INCLUDING --
-- NEGLIGENCE OR OTHERWISE) ARISING IN ANY WAY OUT OF THE USE OF THIS --
-- SOFTWARE, EVEN IF ADVISED OF THE POSSIBILITY OF SUCH DAMAGE. --
-- --
------------------------------------------------------------------------------
-- $Revision$ $Date$
------------------------------------------------------------------------------
package body WUI.Events.Mouse.Button is
------------
-- Button --
------------
function Button (Self : Mouse_Button_Event'Class) return Mouse_Button is
begin
case WebAPI.UI_Events.Mouse.Mouse_Event'Class
(Self.Event.all).Get_Button is
when 0 =>
return Button_1;
when 1 =>
return Button_2;
when 2 =>
return Button_3;
when others =>
raise Program_Error;
end case;
end Button;
------------------
-- Constructors --
------------------
package body Constructors is
----------------
-- Initialize --
----------------
procedure Initialize
(Self : in out Mouse_Button_Event'Class;
Event : not null access WebAPI.UI_Events.Mouse.Mouse_Event'Class) is
begin
WUI.Events.Mouse.Constructors.Initialize
(Abstract_Mouse_Event'Class (Self), Event);
end Initialize;
end Constructors;
end WUI.Events.Mouse.Button;
|
reznikmm/matreshka | Ada | 5,262 | 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 value specification action is an action that evaluates a value
-- specification.
------------------------------------------------------------------------------
with AMF.UML.Actions;
limited with AMF.UML.Output_Pins;
limited with AMF.UML.Value_Specifications;
package AMF.UML.Value_Specification_Actions is
pragma Preelaborate;
type UML_Value_Specification_Action is limited interface
and AMF.UML.Actions.UML_Action;
type UML_Value_Specification_Action_Access is
access all UML_Value_Specification_Action'Class;
for UML_Value_Specification_Action_Access'Storage_Size use 0;
not overriding function Get_Result
(Self : not null access constant UML_Value_Specification_Action)
return AMF.UML.Output_Pins.UML_Output_Pin_Access is abstract;
-- Getter of ValueSpecificationAction::result.
--
-- Gives the output pin on which the result is put.
not overriding procedure Set_Result
(Self : not null access UML_Value_Specification_Action;
To : AMF.UML.Output_Pins.UML_Output_Pin_Access) is abstract;
-- Setter of ValueSpecificationAction::result.
--
-- Gives the output pin on which the result is put.
not overriding function Get_Value
(Self : not null access constant UML_Value_Specification_Action)
return AMF.UML.Value_Specifications.UML_Value_Specification_Access is abstract;
-- Getter of ValueSpecificationAction::value.
--
-- Value specification to be evaluated.
not overriding procedure Set_Value
(Self : not null access UML_Value_Specification_Action;
To : AMF.UML.Value_Specifications.UML_Value_Specification_Access) is abstract;
-- Setter of ValueSpecificationAction::value.
--
-- Value specification to be evaluated.
end AMF.UML.Value_Specification_Actions;
|
AdaCore/training_material | Ada | 815 | ads | package Pixels is
Pixel_Bits : constant Positive := 8;
type Pixel_Component_T
--$ begin question
-- TODO: Declare integer 0 to 2^(Pixel_Bits)
is new Integer;
--$ end question
--$ line answer
is range 0 .. (2 ** Pixel_Bits) - 1;
type Pixel_T is record
--$ begin question
-- TODO: At least R, G, B pixel components
-- replace those dummy variables with the proper name and type
DUMMY1, DUMMY2, DUMMY3, DUMMY4 : Integer;
--$ end question
--$ begin answer
R, G, B, A : Pixel_Component_T;
--$ end answer
end record;
function "+" (A, B : Pixel_T) return Pixel_T;
function Luminosity (P : Pixel_T) return Pixel_Component_T;
-- Returns the pixel luminosity as the mean of its components
end Pixels;
|
Tim-Tom/project-euler | Ada | 4,833 | adb | with Ada.Text_IO;
package body Problem_68 is
package IO renames Ada.Text_IO;
-- They want 16 digit strings, so we know that every solution will
-- have a 10 on the outside edge of one of the flanges, so we can
-- always start there.
subtype Digit is Positive range 1 .. 10;
subtype Position is Positive range 1 .. 10;
taken : Array (Digit) of Boolean := (10 => True, others => False);
-- 1 + 2 + 3
-- 4 + 3 + 5
-- 6 + 5 + 7
-- 8 + 7 + 9
-- 10 + 9 + 2
values : Array (Position) of Digit;
flanges : constant Array(1 .. 5) of Position := (1, 4, 6, 8, 10);
output_order : constant Array (1 .. 15) of Positive := (1, 2, 3, 4, 3, 5, 6, 5, 7, 8, 7, 9, 10, 9, 2);
result : String(1 .. 16);
sum : Positive;
procedure MakeResult is
min : Position := 1;
flange : Positive := 1;
result_index : Positive := 1;
new_result : String(1 .. 16);
begin
for i in flanges'Range loop
if values(flanges(i)) < values(min) then
flange := i;
min := flanges(i);
end if;
end loop;
flange := flange * 3;
for i in flange .. output_order'Last loop
if values(output_order(i)) = 10 then
new_result(result_index) := '1';
new_result(result_index + 1) := '0';
result_index := result_index + 2;
else
new_result(result_index) := Character'Val(Character'Pos('0') + values(output_order(i)));
result_index := result_index + 1;
end if;
end loop;
for i in 1 .. flange - 1 loop
if values(output_order(i)) = 10 then
new_result(result_index) := '1';
new_result(result_index + 1) := '0';
result_index := result_index + 2;
else
new_result(result_index) := Character'Val(Character'Pos('0') + values(output_order(i)));
result_index := result_index + 1;
end if;
end loop;
if result < new_result then
result := new_result;
end if;
end MakeResult;
procedure SolveTenth is
num : constant Integer := sum - values(9) - values(2);
begin
if (num > 0 and num < 10) and then not taken(num) then
values(10) := num;
taken(num) := True;
MakeResult;
taken(num) := False;
end if;
end SolveTenth;
procedure SolveNinth is
num : constant Integer := sum - values(8) - values(7);
begin
if (num > 0 and num < 10) and then not taken(num) then
values(9) := num;
taken(num) := True;
SolveTenth;
taken(num) := False;
end if;
end SolveNinth;
procedure SolveEighth is
begin
for num in taken'Range loop
if not taken(num) then
values(8) := num;
taken(num) := True;
SolveNinth;
taken(num) := False;
end if;
end loop;
end SolveEighth;
procedure SolveSeventh is
num : constant Integer := sum - values(6) - values(5);
begin
if (num > 0 and num < 10) and then not taken(num) then
values(7) := num;
taken(num) := True;
SolveEighth;
taken(num) := False;
end if;
end SolveSeventh;
procedure SolveSixth is
begin
for num in taken'Range loop
if not taken(num) then
values(6) := num;
taken(num) := True;
SolveSeventh;
taken(num) := False;
end if;
end loop;
end SolveSixth;
procedure SolveFifth is
num : constant Integer := sum - values(3) - values(4);
begin
if (num > 0 and num < 10) and then not taken(num) then
values(5) := num;
taken(num) := True;
SolveSixth;
taken(num) := False;
end if;
end SolveFifth;
procedure SolveFourth is
begin
for num in taken'Range loop
if not taken(num) then
values(4) := num;
taken(num) := True;
SolveFifth;
taken(num) := False;
end if;
end loop;
end SolveFourth;
procedure SolveThird is
begin
for num in taken'Range loop
if not taken(num) then
values(3) := num;
taken(num) := True;
sum := values(1) + values(2) + values(3);
SolveFourth;
taken(num) := False;
end if;
end loop;
end SolveThird;
procedure SolveSecond is
begin
for num in taken'Range loop
if not taken(num) then
values(2) := num;
taken(num) := True;
SolveThird;
taken(num) := False;
end if;
end loop;
end SolveSecond;
procedure Solve is
begin
values(1) := 10;
SolveSecond;
IO.Put_Line(result);
end Solve;
end Problem_68;
|
godunko/adagl | Ada | 4,660 | adb | ------------------------------------------------------------------------------
-- --
-- Ada binding for OpenGL/WebGL --
-- --
-- Runtime Library Component --
-- --
------------------------------------------------------------------------------
-- --
-- Copyright © 2016-2018, Vadim Godunko <[email protected]> --
-- All rights reserved. --
-- --
-- Redistribution and use in source and binary forms, with or without --
-- modification, are permitted provided that the following conditions --
-- are met: --
-- --
-- * Redistributions of source code must retain the above copyright --
-- notice, this list of conditions and the following disclaimer. --
-- --
-- * Redistributions in binary form must reproduce the above copyright --
-- notice, this list of conditions and the following disclaimer in the --
-- documentation and/or other materials provided with the distribution. --
-- --
-- * Neither the name of the Vadim Godunko, IE nor the names of its --
-- contributors may be used to endorse or promote products derived from --
-- this software without specific prior written permission. --
-- --
-- THIS SOFTWARE IS PROVIDED BY THE COPYRIGHT HOLDERS AND CONTRIBUTORS --
-- "AS IS" AND ANY EXPRESS OR IMPLIED WARRANTIES, INCLUDING, BUT NOT --
-- LIMITED TO, THE IMPLIED WARRANTIES OF MERCHANTABILITY AND FITNESS FOR --
-- A PARTICULAR PURPOSE ARE DISCLAIMED. IN NO EVENT SHALL THE COPYRIGHT --
-- HOLDER OR CONTRIBUTORS BE LIABLE FOR ANY DIRECT, INDIRECT, INCIDENTAL, --
-- SPECIAL, EXEMPLARY, OR CONSEQUENTIAL DAMAGES (INCLUDING, BUT NOT LIMITED --
-- TO, PROCUREMENT OF SUBSTITUTE GOODS OR SERVICES; LOSS OF USE, DATA, OR --
-- PROFITS; OR BUSINESS INTERRUPTION) HOWEVER CAUSED AND ON ANY THEORY OF --
-- LIABILITY, WHETHER IN CONTRACT, STRICT LIABILITY, OR TORT (INCLUDING --
-- NEGLIGENCE OR OTHERWISE) ARISING IN ANY WAY OUT OF THE USE OF THIS --
-- SOFTWARE, EVEN IF ADVISED OF THE POSSIBILITY OF SUCH DAMAGE. --
-- --
------------------------------------------------------------------------------
with OpenGL.Contexts.Internals;
package body OpenGL.Shaders is
-------------------------
-- Compile_Source_Code --
-------------------------
function Compile_Source_Code
(Self : in out OpenGL_Shader'Class;
Source : League.Strings.Universal_String) return Boolean
is
use type WebAPI.WebGL.Shaders.WebGL_Shader_Access;
use type WebAPI.WebGL.Rendering_Contexts.WebGL_Rendering_Context_Access;
begin
if Self.Context = null then
Self.Context := OpenGL.Contexts.Internals.Current_WebGL_Context;
if Self.Context = null then
return False;
end if;
end if;
if Self.Shader = null then
Self.Shader :=
Self.Context.Create_Shader
((case Self.Shader_Type is
when Vertex => WebAPI.WebGL.Rendering_Contexts.VERTEX_SHADER,
when Fragment =>
WebAPI.WebGL.Rendering_Contexts.FRAGMENT_SHADER));
if Self.Shader = null then
return False;
end if;
end if;
Self.Context.Shader_Source (Self.Shader, Source);
Self.Context.Compile_Shader (Self.Shader);
if not Self.Context.Get_Shader_Parameter
(Self.Shader, WebAPI.WebGL.Rendering_Contexts.COMPILE_STATUS)
then
Self.Context.Delete_Shader (Self.Shader);
Self.Shader := null;
Self.Context := null;
-- XXX Error handling must be implemented.
raise Program_Error;
end if;
return True;
end Compile_Source_Code;
end OpenGL.Shaders;
|
sungyeon/drake | Ada | 1,557 | ads | pragma License (Unrestricted);
-- implementation unit required by compiler
with Interfaces;
package System.Atomic_Primitives is
pragma Preelaborate;
-- required for pragma Lock_Free by compiler (s-atopri.ads)
subtype uint8 is Interfaces.Unsigned_8;
subtype uint16 is Interfaces.Unsigned_16;
subtype uint32 is Interfaces.Unsigned_32;
subtype uint64 is Interfaces.Unsigned_64;
function Lock_Free_Read_8 (Ptr : Address) return Interfaces.Unsigned_8;
function Lock_Free_Read_16 (Ptr : Address) return Interfaces.Unsigned_16;
function Lock_Free_Read_32 (Ptr : Address) return Interfaces.Unsigned_32;
function Lock_Free_Read_64 (Ptr : Address) return Interfaces.Unsigned_64;
pragma Inline (Lock_Free_Read_8);
pragma Inline (Lock_Free_Read_16);
pragma Inline (Lock_Free_Read_32);
pragma Inline (Lock_Free_Read_64);
function Lock_Free_Try_Write_8 (
Ptr : Address;
Expected : in out Interfaces.Unsigned_8;
Desired : Interfaces.Unsigned_8)
return Boolean;
function Lock_Free_Try_Write_16 (
Ptr : Address;
Expected : in out Interfaces.Unsigned_16;
Desired : Interfaces.Unsigned_16)
return Boolean;
function Lock_Free_Try_Write_32 (
Ptr : Address;
Expected : in out Interfaces.Unsigned_32;
Desired : Interfaces.Unsigned_32)
return Boolean;
function Lock_Free_Try_Write_64 (
Ptr : Address;
Expected : in out Interfaces.Unsigned_64;
Desired : Interfaces.Unsigned_64)
return Boolean;
end System.Atomic_Primitives;
|
ekoeppen/STM32_Generic_Ada_Drivers | Ada | 883 | adb | with STM32_SVD; use STM32_SVD;
with STM32_SVD.RCC;
with STM32_SVD.NVIC;
with Ada.Text_IO;
package body STM32GD.Board is
procedure Init is
begin
STM32_SVD.RCC.RCC_Periph.APB2ENR.AFIOEN := 1;
STM32_SVD.RCC.RCC_Periph.APB2ENR.IOPAEN := 1;
STM32_SVD.RCC.RCC_Periph.APB2ENR.IOPBEN := 1;
STM32_SVD.RCC.RCC_Periph.APB2ENR.IOPCEN := 1;
STM32_SVD.NVIC.NVIC_Periph.ISER0 := 2#00000000_10000000_00000000_00000000#;
BUTTON.Init;
USB_DISC.Init;
SWO.Init;
LED.Init;
LED2.Init;
end Init;
procedure USB_Re_Enumerate is
begin
Ada.Text_IO.Put_Line ("Re-enumerate");
USB_DISC.Set;
declare
I : UInt32 with volatile;
begin
I := 10000;
while I > 0 loop
I := I - 1;
end loop;
end;
USB_DISC.Clear;
end USB_Re_Enumerate;
end STM32GD.Board;
|
Fabien-Chouteau/Ada_Drivers_Library | Ada | 1,938 | ads | -- This package was generated by the Ada_Drivers_Library project wizard script
package ADL_Config is
Vendor : constant String := "STMicro"; -- From board definition
Max_Mount_Points : constant := 2; -- From default value
Max_Mount_Name_Length : constant := 128; -- From default value
Runtime_Profile : constant String := "ravenscar-sfp"; -- From command line
Device_Name : constant String := "STM32F429ZITx"; -- From board definition
Device_Family : constant String := "STM32F4"; -- From board definition
Has_Ravenscar_SFP_Runtime : constant String := "True"; -- From board definition
Runtime_Name : constant String := "ravenscar-sfp-stm32f429disco"; -- From default value
Has_Ravenscar_Full_Runtime : constant String := "True"; -- From board definition
CPU_Core : constant String := "ARM Cortex-M4F"; -- From mcu definition
Board : constant String := "STM32F429_Discovery"; -- From command line
Has_ZFP_Runtime : constant String := "False"; -- From board definition
Number_Of_Interrupts : constant := 0; -- From default value
High_Speed_External_Clock : constant := 8000000; -- From board definition
Use_Startup_Gen : constant Boolean := False; -- From command line
Max_Path_Length : constant := 1024; -- From default value
Runtime_Name_Suffix : constant String := "stm32f429disco"; -- From board definition
Architecture : constant String := "ARM"; -- From board definition
end ADL_Config;
|
ekoeppen/STM32_Generic_Ada_Drivers | Ada | 4,696 | adb | with Ada.Unchecked_Conversion;
with System.Machine_Code; use System.Machine_Code;
with System; use System;
with System.Storage_Elements; use System.Storage_Elements;
with Interfaces; use Interfaces;
with STM32_SVD; use STM32_SVD;
with Flash;
with STM32GD.Board;
with STM32_SVD.RCC;
procedure Bootloader is
Line : array (Unsigned_32 range 0 .. 47) of Unsigned_8;
Count : Unsigned_8;
C : Byte;
function W is new Ada.Unchecked_Conversion (Address, Unsigned_32);
Reset_Vector_Address : constant Unsigned_32 := 16#0800_0004#;
Bootloader: constant Storage_Element
with Import, Convention => Asm, External_Name => "__bootloader";
User_Vector: constant Storage_Element
with Import, Convention => Asm, External_Name => "__bootloader_data";
Flash_Segment_Size : constant Unsigned_32 := 1024;
-- with Import, Convention => Asm, External_Name => "__page_size";
Bootloader_Address : constant Unsigned_32 := W (Bootloader'Address);
User_Vector_Address : constant Unsigned_32 := W (User_Vector'Address);
package Board renames STM32GD.Board;
package USART renames Board.USART;
procedure Erase is
Addr : Unsigned_32 := 16#0800_0000#;
Saved_Vector_Low : Unsigned_16;
Saved_Vector_High : Unsigned_16;
begin
Saved_Vector_Low := Flash.Read (Reset_Vector_Address);
Saved_Vector_High := Flash.Read (Reset_Vector_Address + 2);
Flash.Unlock;
while Addr < Bootloader_Address loop
Flash.Erase (Addr);
Addr := Addr + Flash_Segment_Size;
end loop;
Flash.Enable_Write;
Flash.Write (Reset_Vector_Address, Saved_Vector_Low);
Flash.Write (Reset_Vector_Address + 2, Saved_Vector_High);
Flash.Lock;
end Erase;
function Nibble (N : Unsigned_8) return Unsigned_8 is
begin
return (if N >= 65 then N - 65 + 10 else N - 48);
end Nibble;
function From_Hex (I : Unsigned_32) return Unsigned_8 is
begin
return 16 * Nibble (Line (I)) + Nibble (Line (I + 1));
end From_Hex;
procedure Write (Addr : Unsigned_32) is
Value : Unsigned_16;
Write_Addr : Unsigned_32 := Addr;
J : Unsigned_32;
begin
Flash.Unlock;
J := 9;
for I in Unsigned_32 range 1 .. Unsigned_32 (Count) / 2 loop
Flash.Enable_Write;
Value := Unsigned_16 (From_Hex (J)) +
256 * Unsigned_16 (From_Hex (J + 2));
if Write_Addr = Reset_Vector_Address then
Flash.Write (User_Vector_Address, Value);
elsif Write_Addr = Reset_Vector_Address + 2 then
Flash.Write (User_Vector_Address + 2, Value);
else
Flash.Write (Write_Addr, Value);
end if;
J := J + 4;
Write_Addr := Write_Addr + Unsigned_32 (2);
end loop;
Flash.Lock;
end Write;
procedure Read_Lines is
Record_Type : Unsigned_8;
XON : constant Byte := 17;
XOFF : constant Byte := 19;
Offset : Unsigned_32 := 0;
Addr : Unsigned_32;
begin
loop
USART.Transmit (XON);
for I in Line'Range loop
Line (I) := Unsigned_8 (USART.Receive);
exit when Line (I) = 10;
end loop;
USART.Transmit (XOFF);
Count := From_Hex (1);
Addr := Unsigned_32 (From_Hex (3)) * 256 + Unsigned_32 (From_Hex (5));
Record_Type := From_Hex (7);
case Record_Type is
when 16#00# => Write (Addr + Offset);
when 16#04# => Offset := (Unsigned_32 (From_Hex (9)) * 256 + Unsigned_32 (From_Hex (11))) * 2 ** 16;
when 16#80# => Flash.Erase (Addr + Offset);
when others => null;
end case;
end loop;
end Read_Lines;
begin
Board.TX.Enable;
Board.RX.Enable;
USART.Enable;
Board.TX.Init;
Board.RX.Init;
USART.Init;
loop
USART.Transmit (Character'Pos ('?'));
for I in 0 .. 16#0010_0000# loop
if USART.Data_Available then
loop
C := USART.Receive;
USART.Transmit (C);
exit when not USART.Data_Available and then (C = 10 or else C = 13);
end loop;
USART.Transmit (Character'Pos ('F'));
USART.Transmit (10);
Flash.Init;
Erase;
Read_Lines;
end if;
end loop;
if Flash.Read (User_Vector_Address) /= 16#FFFF# then
USART.Transmit (Character'Pos ('R'));
USART.Transmit (10);
Asm ("movs r1, #0; ldr r1, [r1]; mov sp, r1", Volatile => True);
Asm ("ldr r0, =__bootloader_data", Volatile => True);
Asm ("ldr r0, [r0]; bx r0", Volatile => True);
end if;
end loop;
end Bootloader;
|
reznikmm/matreshka | Ada | 4,315 | 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.ODF_String_Constants;
package body Matreshka.ODF_XML is
------------------
-- Constructors --
------------------
package body Constructors is
----------------
-- Initialize --
----------------
procedure Initialize
(Self : not null access Abstract_XML_Attribute_Node'Class;
Document : not null Matreshka.DOM_Nodes.Document_Access;
Prefix : League.Strings.Universal_String) is
begin
Matreshka.DOM_Attributes.Constructors.Initialize (Self, Document);
Self.Prefix := Prefix;
end Initialize;
end Constructors;
-----------------------
-- Get_Namespace_URI --
-----------------------
overriding function Get_Namespace_URI
(Self : not null access constant Abstract_XML_Attribute_Node)
return League.Strings.Universal_String is
begin
return Matreshka.ODF_String_Constants.FO_URI;
end Get_Namespace_URI;
end Matreshka.ODF_XML;
|
reznikmm/matreshka | Ada | 3,652 | 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.Standard_Profile_L2.Metaclasses.Hash is
new AMF.Elements.Generic_Hash (Standard_Profile_L2_Metaclass, Standard_Profile_L2_Metaclass_Access);
|
BrickBot/Bound-T-H8-300 | Ada | 5,047 | adb | -- Storage.List_Cell_Sets (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.2 $
-- $Date: 2015/10/24 20:05:52 $
--
-- $Log: storage-list_cell_sets.adb,v $
-- Revision 1.2 2015/10/24 20:05:52 niklas
-- Moved to free licence.
--
-- Revision 1.1 2009-10-07 19:26:10 niklas
-- BT-CH-0183: Cell-sets are a tagged-type class.
--
package body Storage.List_Cell_Sets is
use Cell_Vectors;
-- overriding
function Empty return Set_T
is
begin
return (Root_Cell_Set_T with List => Empty_List);
end Empty;
-- overriding
procedure Erase (Set : in out Set_T)
is
begin
Erase (Set.List);
end Erase;
-- overriding
function Is_Empty (Item : Set_T) return Boolean
is
begin
return Length (Item.List) = 0;
end Is_Empty;
-- overriding
function Is_Member (
Cell : Cell_T;
Of_Set : Set_T)
return Boolean
is
begin
return Is_Element (Of_Set.List, Cell);
end Is_Member;
-- overriding
function Card (Set : Set_T) return Natural
is
begin
return Length (Set.List);
end Card;
-- overriding
function To_Set (List : Cell_List_T) return Set_T
is
Result : Set_T;
-- The result, default initialized to empty set.
begin
for L in reverse List'Range loop
Set (
Vector => Result.List,
Index => L - List'First + 1,
To => List(L));
end loop;
return Result;
end To_Set;
-- overriding
function To_List (Set : Set_T) return Cell_List_T
is
begin
return To_Vector (Set.List);
end To_List;
-- overriding
procedure Add (
Cell : in Cell_T;
To : in out Set_T)
is
begin
Add (Value => Cell, To => To.List);
end Add;
-- overriding
procedure Add (
Cell : in Cell_T;
To : in out Set_T;
Added : in out Boolean)
is
Orig_Length : constant Natural := Length (To.List);
begin
Add (Value => Cell, To => To.List);
if Length (To.List) > Orig_Length then
Added := True;
end if;
end Add;
-- overriding
procedure Remove (
Cell : in Cell_T;
From : in out Set_T)
is
I : constant Natural := Index (From.List, Cell);
-- The index of the Cell in the From set, if present,
-- otherwise > Last (From).
begin
if I <= Last (From.List) then
Drop (I, From.List);
end if;
end Remove;
-- overriding
procedure Move_Cells (
From : in out Set_T;
To : in out Set_T)
is
begin
Move_All (From => From.List, To => To.List);
end Move_Cells;
-- overriding
function Copy (Item : Cell_Set_T) return Set_T
is
begin
if Item in Set_T'Class then
-- A plain copy without type conversion.
return Set_T (Item);
else
-- A type conversion.
return To_Set (To_List (Item));
end if;
end Copy;
-- overriding
function "=" (Left, Right : Set_T) return Boolean
is
begin
return Left.List = Right.List;
end "=";
procedure Print_Debug_Pool
is
begin
Cell_Vectors.Print_Debug_Pool;
end Print_Debug_Pool;
end Storage.List_Cell_Sets;
|
charlie5/lace | Ada | 1,453 | ads | with
ada.Strings.unbounded;
package XML.Reader
is
use ada.Strings.unbounded;
type Parser is private;
function Create_Parser return Parser;
type Start_Element_Handler is access procedure (Name : in unbounded_String;
Atts : in XML.Attributes_view);
type End_Element_Handler is access procedure (Name : in unbounded_String);
procedure Set_Element_Handler (The_Parser : in Parser;
Start_Handler : in Start_Element_Handler;
End_Handler : in End_Element_Handler);
type Character_Data_Handler is access procedure (Data: in unbounded_String);
procedure Set_Character_Data_Handler (The_Parser : in Parser;
CD_Handler : in Character_Data_Handler);
procedure Parse (The_Parser : in Parser;
XML : in String;
Is_Final : in Boolean);
XML_Parse_Error : exception;
private
type XML_Parser_Ptr is access all Character; -- Essentially, C's "void *".
type Parser_Rec is
record
XML_Parser : XML_Parser_Ptr;
Start_Handler : Start_Element_Handler;
End_Handler : End_Element_Handler;
CD_Handler : Character_Data_Handler;
end record;
type Parser is access Parser_Rec;
-- pragma Linker_Options ("-lexpat");
end XML.Reader;
|
reznikmm/webdriver | Ada | 6,257 | adb | -- Copyright (c) 2017 Maxim Reznik <[email protected]>
--
-- SPDX-License-Identifier: MIT
-- License-Filename: LICENSE
-------------------------------------------------------------
with League.JSON.Arrays;
with League.JSON.Values;
separate (WebDriver.Remote)
package body Elements is
function "+"
(Text : Wide_Wide_String) return League.Strings.Universal_String
renames League.Strings.To_Universal_String;
function To_Path
(Self : access Element;
Command : Wide_Wide_String;
Suffix : League.Strings.Universal_String :=
League.Strings.Empty_Universal_String)
return League.Strings.Universal_String;
-----------
-- Clear --
-----------
overriding procedure Clear (Self : access Element) is
Command : WebDriver.Remote.Command;
Response : WebDriver.Remote.Response;
pragma Unreferenced (Response);
begin
Command.Method := Get;
Command.Path := To_Path (Self, "/clear");
Response := Self.Executor.Execute (Command);
end Clear;
-----------
-- Click --
-----------
overriding procedure Click (Self : access Element) is
Command : WebDriver.Remote.Command;
Response : WebDriver.Remote.Response;
pragma Unreferenced (Response);
begin
Command.Method := Get;
Command.Path := To_Path (Self, "/click");
Response := Self.Executor.Execute (Command);
end Click;
-------------------
-- Get_Attribute --
-------------------
overriding function Get_Attribute
(Self : access Element;
Name : League.Strings.Universal_String)
return League.Strings.Universal_String
is
Command : WebDriver.Remote.Command;
Response : WebDriver.Remote.Response;
begin
Command.Method := Get;
Command.Path := To_Path (Self, "/attribute", Name);
Response := Self.Executor.Execute (Command);
return Response.Value (+"value").To_String;
end Get_Attribute;
-------------------
-- Get_CSS_Value --
-------------------
overriding function Get_CSS_Value
(Self : access Element;
Name : League.Strings.Universal_String)
return League.Strings.Universal_String
is
Command : WebDriver.Remote.Command;
Response : WebDriver.Remote.Response;
begin
Command.Method := Get;
Command.Path := To_Path (Self, "/css", Name);
Response := Self.Executor.Execute (Command);
return Response.Value (+"value").To_String;
end Get_CSS_Value;
------------------
-- Get_Property --
------------------
overriding function Get_Property
(Self : access Element;
Name : League.Strings.Universal_String)
return League.Strings.Universal_String
is
Command : WebDriver.Remote.Command;
Response : WebDriver.Remote.Response;
begin
Command.Method := Get;
Command.Path := To_Path (Self, "/property", Name);
Response := Self.Executor.Execute (Command);
return Response.Value (+"value").To_String;
end Get_Property;
------------------
-- Get_Tag_Name --
------------------
overriding function Get_Tag_Name
(Self : access Element) return League.Strings.Universal_String
is
Command : WebDriver.Remote.Command;
Response : WebDriver.Remote.Response;
begin
Command.Method := Get;
Command.Path := To_Path (Self, "/name");
Response := Self.Executor.Execute (Command);
return Response.Value (+"value").To_String;
end Get_Tag_Name;
--------------
-- Get_Text --
--------------
overriding function Get_Text
(Self : access Element) return League.Strings.Universal_String
is
Command : WebDriver.Remote.Command;
Response : WebDriver.Remote.Response;
begin
Command.Method := Get;
Command.Path := To_Path (Self, "/text");
Response := Self.Executor.Execute (Command);
return Response.Value (+"value").To_String;
end Get_Text;
----------------
-- Is_Enabled --
----------------
overriding function Is_Enabled (Self : access Element) return Boolean is
Command : WebDriver.Remote.Command;
Response : WebDriver.Remote.Response;
begin
Command.Method := Get;
Command.Path := To_Path (Self, "/enabled");
Response := Self.Executor.Execute (Command);
return Response.Value (+"value").To_Boolean;
end Is_Enabled;
-----------------
-- Is_Selected --
-----------------
overriding function Is_Selected (Self : access Element) return Boolean is
Command : WebDriver.Remote.Command;
Response : WebDriver.Remote.Response;
begin
Command.Method := Get;
Command.Path := To_Path (Self, "/selected");
Response := Self.Executor.Execute (Command);
return Response.Value (+"value").To_Boolean;
end Is_Selected;
---------------
-- Send_Keys --
---------------
overriding procedure Send_Keys
(Self : access Element;
Text : League.String_Vectors.Universal_String_Vector)
is
Command : WebDriver.Remote.Command;
Response : WebDriver.Remote.Response;
List : League.JSON.Arrays.JSON_Array;
pragma Unreferenced (Response);
begin
Command.Method := Post;
Command.Path := To_Path (Self, "/value");
for J in 1 .. Text.Length loop
List.Append (League.JSON.Values.To_JSON_Value (Text.Element (J)));
end loop;
Command.Parameters.Insert (+"value", List.To_JSON_Value);
Response := Self.Executor.Execute (Command);
end Send_Keys;
-------------
-- To_Path --
-------------
function To_Path
(Self : access Element;
Command : Wide_Wide_String;
Suffix : League.Strings.Universal_String :=
League.Strings.Empty_Universal_String)
return League.Strings.Universal_String
is
Result : League.Strings.Universal_String;
begin
Result.Append ("/session/");
Result.Append (Self.Session_Id);
Result.Append ("/element/");
Result.Append (Self.Element_Id);
Result.Append (Command);
if not Suffix.Is_Empty then
Result.Append ("/");
Result.Append (Suffix);
end if;
return Result;
end To_Path;
end Elements;
|
Fabien-Chouteau/minisamd51_bsp | Ada | 7,459 | adb | ------------------------------------------------------------------------------
-- --
-- Copyright (C) 2020, AdaCore --
-- --
-- Redistribution and use in source and binary forms, with or without --
-- modification, are permitted provided that the following conditions are --
-- met: --
-- 1. Redistributions of source code must retain the above copyright --
-- notice, this list of conditions and the following disclaimer. --
-- 2. Redistributions in binary form must reproduce the above copyright --
-- notice, this list of conditions and the following disclaimer in --
-- the documentation and/or other materials provided with the --
-- distribution. --
-- 3. Neither the name of the copyright holder nor the names of its --
-- contributors may be used to endorse or promote products derived --
-- from this software without specific prior written permission. --
-- --
-- THIS SOFTWARE IS PROVIDED BY THE COPYRIGHT HOLDERS AND CONTRIBUTORS --
-- "AS IS" AND ANY EXPRESS OR IMPLIED WARRANTIES, INCLUDING, BUT NOT --
-- LIMITED TO, THE IMPLIED WARRANTIES OF MERCHANTABILITY AND FITNESS FOR --
-- A PARTICULAR PURPOSE ARE DISCLAIMED. IN NO EVENT SHALL THE COPYRIGHT --
-- HOLDER OR CONTRIBUTORS BE LIABLE FOR ANY DIRECT, INDIRECT, INCIDENTAL, --
-- SPECIAL, EXEMPLARY, OR CONSEQUENTIAL DAMAGES (INCLUDING, BUT NOT --
-- LIMITED TO, PROCUREMENT OF SUBSTITUTE GOODS OR SERVICES; LOSS OF USE, --
-- DATA, OR PROFITS; OR BUSINESS INTERRUPTION) HOWEVER CAUSED AND ON ANY --
-- THEORY OF LIABILITY, WHETHER IN CONTRACT, STRICT LIABILITY, OR TORT --
-- (INCLUDING NEGLIGENCE OR OTHERWISE) ARISING IN ANY WAY OUT OF THE USE --
-- OF THIS SOFTWARE, EVEN IF ADVISED OF THE POSSIBILITY OF SUCH DAMAGE. --
-- --
------------------------------------------------------------------------------
with System;
with System.Storage_Elements;
with HAL.GPIO;
with SAM.Clock_Setup_120Mhz;
with SAM.Main_Clock;
with SAM.Clock_Generator;
with SAM.Clock_Generator.IDs;
with SAM.Functions;
----------------
-- Minisamd51 --
----------------
package body Minisamd51 is
System_Vectors : constant HAL.UInt32;
pragma Import (Asm, System_Vectors, "__vectors");
VTOR : System.Address
with Volatile,
Address => System.Storage_Elements.To_Address (16#E000_ED08#);
procedure Init_System;
procedure Init_I2C;
procedure Init_SPI;
-----------------
-- Init_System --
-----------------
procedure Init_System is
begin
-- Set the vector table address
VTOR := System_Vectors'Address;
-- Setup the clock system
SAM.Clock_Setup_120Mhz.Initialize_Clocks;
LED.Clear;
LED.Set_Mode (HAL.GPIO.Output);
LED.Set_Pull_Resistor (HAL.GPIO.Floating);
Button.Clear;
Button.Set_Mode (HAL.GPIO.Input);
Button.Set_Pull_Resistor (HAL.GPIO.Floating);
DOTSTAR_DATA.Clear;
DOTSTAR_DATA.Set_Mode (HAL.GPIO.Output);
DOTSTAR_DATA.Set_Pull_Resistor (HAL.GPIO.Pull_Down);
DOTSTAR_CLK.Clear;
DOTSTAR_CLK.Set_Mode (HAL.GPIO.Output);
DOTSTAR_CLK.Set_Pull_Resistor (HAL.GPIO.Pull_Down);
end Init_System;
--------------
-- Init_I2C --
--------------
procedure Init_I2C is
begin
SAM.Clock_Generator.Configure_Periph_Channel
(SAM.Clock_Generator.IDs.SERCOM2_CORE,
SAM.Clock_Setup_120Mhz.Clk_48Mhz);
SAM.Clock_Generator.Configure_Periph_Channel
(SAM.Clock_Generator.IDs.SERCOM2_SLOW,
SAM.Clock_Setup_120Mhz.Clk_32Khz);
SAM.Main_Clock.SERCOM2_On;
-- I2C --
I2C_Port.Configure (Baud => 150);
I2C_Port.Debug_Stop_Mode (Enabled => True);
I2C_Port.Enable;
-- IOs --
SCL.Clear;
SCL.Set_Mode (HAL.GPIO.Output);
SCL.Set_Pull_Resistor (HAL.GPIO.Floating);
SCL.Set_Function (SAM.Functions.PA13_SERCOM2_PAD1);
SDA.Clear;
SDA.Set_Mode (HAL.GPIO.Output);
SDA.Set_Pull_Resistor (HAL.GPIO.Floating);
SDA.Set_Function (SAM.Functions.PA12_SERCOM2_PAD0);
end Init_I2C;
--------------
-- Init_SPI --
--------------
procedure Init_SPI is
begin
-- Clocks --
SAM.Clock_Generator.Configure_Periph_Channel
(SAM.Clock_Generator.IDs.SERCOM1_CORE,
SAM.Clock_Setup_120Mhz.Clk_48Mhz);
SAM.Clock_Generator.Configure_Periph_Channel
(SAM.Clock_Generator.IDs.SERCOM1_SLOW,
SAM.Clock_Setup_120Mhz.Clk_32Khz);
SAM.Main_Clock.SERCOM1_On;
-- SPI --
SPI_Port.Configure
(Baud => 1,
Data_Order => SAM.SERCOM.SPI.Most_Significant_First,
Phase => SAM.SERCOM.SPI.Sample_Leading_Edge,
Polarity => SAM.SERCOM.SPI.Active_High,
DIPO => 0,
DOPO => 2,
Slave_Select_Enable => False);
SPI_Port.Debug_Stop_Mode (Enabled => True);
SPI_Port.Enable;
-- IOs --
SCK.Clear;
SCK.Set_Mode (HAL.GPIO.Output);
SCK.Set_Pull_Resistor (HAL.GPIO.Floating);
SCK.Set_Function (SAM.Functions.PA01_SERCOM1_PAD1);
MOSI.Clear;
MOSI.Set_Mode (HAL.GPIO.Output);
MOSI.Set_Pull_Resistor (HAL.GPIO.Floating);
MOSI.Set_Function (SAM.Functions.PB22_SERCOM1_PAD2);
MISO.Clear;
MISO.Set_Mode (HAL.GPIO.Output);
MISO.Set_Pull_Resistor (HAL.GPIO.Floating);
MISO.Set_Function (SAM.Functions.PB23_SERCOM1_PAD3);
end Init_SPI;
-----------------
-- Turn_On_LED --
-----------------
procedure Turn_On_LED is
begin
LED.Set;
end Turn_On_LED;
------------------
-- Turn_Off_LED --
------------------
procedure Turn_Off_LED is
begin
LED.Clear;
end Turn_Off_LED;
--------------------
-- Button_Pressed --
--------------------
function Button_Pressed return Boolean
is (Button.Set);
-------------
-- Set_RGB --
-------------
procedure Set_RGB (Brightness : HAL.UInt5;
R, G, B : HAL.UInt8)
is
use HAL;
procedure Bitbang (Val : UInt8);
procedure Bitbang (Val : UInt8) is
Shift : UInt8 := Val;
begin
for X in 1 .. 8 loop
DOTSTAR_CLK.Clear;
if (Shift and 2#1000_0000#) /= 0 then
DOTSTAR_DATA.Set;
else
DOTSTAR_DATA.Clear;
end if;
DOTSTAR_CLK.Set;
Shift := Shift_Left (Shift, 1);
end loop;
DOTSTAR_CLK.Clear;
end Bitbang;
begin
-- Start frame
for X in 1 .. 4 loop
Bitbang (0);
end loop;
Bitbang (2#1110_0000# or UInt8 (Brightness));
Bitbang (B);
Bitbang (G);
Bitbang (R);
-- End Frame
for X in 1 .. 4 loop
Bitbang (HAL.UInt8'Last);
end loop;
end Set_RGB;
begin
Init_System;
Init_I2C;
Init_SPI;
end Minisamd51;
|
Letractively/ada-ado | Ada | 13,280 | adb | -----------------------------------------------------------------------
-- ado-queries-loaders -- Loader for Database Queries
-- Copyright (C) 2011, 2012, 2013, 2014 Stephane Carrez
-- Written by Stephane Carrez ([email protected])
--
-- Licensed under the Apache License, Version 2.0 (the "License");
-- you may not use this file except in compliance with the License.
-- You may obtain a copy of the License at
--
-- http://www.apache.org/licenses/LICENSE-2.0
--
-- Unless required by applicable law or agreed to in writing, software
-- distributed under the License is distributed on an "AS IS" BASIS,
-- WITHOUT WARRANTIES OR CONDITIONS OF ANY KIND, either express or implied.
-- See the License for the specific language governing permissions and
-- limitations under the License.
-----------------------------------------------------------------------
with Interfaces;
with Ada.IO_Exceptions;
with Ada.Directories;
with Ada.Unchecked_Deallocation;
with ADO.Drivers.Connections;
with Util.Files;
with Util.Log.Loggers;
with Util.Beans.Objects;
with Util.Serialize.IO.XML;
with Util.Serialize.Mappers.Record_Mapper;
package body ADO.Queries.Loaders is
use Util.Log;
use ADO.Drivers.Connections;
use Interfaces;
use Ada.Calendar;
Log : constant Loggers.Logger := Loggers.Create ("ADO.Queries.Loaders");
Base_Time : constant Ada.Calendar.Time := Ada.Calendar.Time_Of (Year => 1970,
Month => 1,
Day => 1);
-- Check for file modification time at most every 60 seconds.
FILE_CHECK_DELTA_TIME : constant Unsigned_32 := 60;
-- The list of query files defined by the application.
Query_Files : Query_File_Access := null;
-- Convert a Time to an Unsigned_32.
function To_Unsigned_32 (T : in Ada.Calendar.Time) return Unsigned_32;
pragma Inline_Always (To_Unsigned_32);
-- Get the modification time of the XML query file associated with the query.
function Modification_Time (Query : in Query_Definition_Access) return Unsigned_32;
-- Initialize the query SQL pattern with the value
procedure Set_Query_Pattern (Into : in out Query_Pattern;
Value : in Util.Beans.Objects.Object);
-- ------------------------------
-- Register the query definition in the query file. Registration is done
-- in the package elaboration phase.
-- ------------------------------
procedure Register (File : in Query_File_Access;
Query : in Query_Definition_Access) is
begin
Query.File := File;
Query.Next := File.Queries;
File.Queries := Query;
if File.Next = null and then Query_Files /= File then
File.Next := Query_Files;
Query_Files := File;
end if;
end Register;
function Find_Driver (Name : in String) return Integer;
function Find_Driver (Name : in String) return Integer is
begin
if Name'Length = 0 then
return 0;
end if;
declare
Driver : constant Drivers.Connections.Driver_Access
:= Drivers.Connections.Get_Driver (Name);
begin
if Driver = null then
-- There is no problem to have an SQL query for unsupported drivers, but still
-- report some warning.
Log.Warn ("Database driver {0} not found", Name);
return -1;
end if;
return Integer (Driver.Get_Driver_Index);
end;
end Find_Driver;
-- ------------------------------
-- Convert a Time to an Unsigned_32.
-- ------------------------------
function To_Unsigned_32 (T : in Ada.Calendar.Time) return Unsigned_32 is
D : constant Duration := Duration '(T - Base_Time);
begin
return Unsigned_32 (D);
end To_Unsigned_32;
-- ------------------------------
-- Get the modification time of the XML query file associated with the query.
-- ------------------------------
function Modification_Time (Query : in Query_Definition_Access) return Unsigned_32 is
begin
return To_Unsigned_32 (Ada.Directories.Modification_Time (Query.File.Path.all));
exception
when Ada.IO_Exceptions.Name_Error =>
Log.Error ("XML query file '{0}' does not exist", Query.File.Path.all);
return 0;
end Modification_Time;
-- ------------------------------
-- Returns True if the XML query file must be reloaded.
-- ------------------------------
function Is_Modified (Query : in Query_Definition_Access) return Boolean is
Now : constant Unsigned_32 := To_Unsigned_32 (Ada.Calendar.Clock);
begin
-- Have we passed the next check time?
if Query.File.Next_Check > Now then
return False;
end if;
-- Next check in N seconds (60 by default).
Query.File.Next_Check := Now + FILE_CHECK_DELTA_TIME;
-- See if the file was changed.
declare
M : constant Unsigned_32 := Modification_Time (Query);
begin
if Query.File.Last_Modified = M then
return False;
end if;
Query.File.Last_Modified := M;
return True;
end;
end Is_Modified;
-- ------------------------------
-- Initialize the query SQL pattern with the value
-- ------------------------------
procedure Set_Query_Pattern (Into : in out Query_Pattern;
Value : in Util.Beans.Objects.Object) is
begin
Into.SQL := Util.Beans.Objects.To_Unbounded_String (Value);
end Set_Query_Pattern;
procedure Read_Query (Into : in Query_File_Access) is
type Query_Info_Fields is (FIELD_CLASS_NAME, FIELD_PROPERTY_TYPE,
FIELD_PROPERTY_NAME, FIELD_QUERY_NAME,
FIELD_SQL_DRIVER,
FIELD_SQL, FIELD_SQL_COUNT, FIELD_QUERY);
-- The Query_Loader holds context and state information for loading
-- the XML query file and initializing the Query_Definition.
type Query_Loader is record
File : Query_File_Access;
Hash_Value : Unbounded_String;
Query_Def : Query_Definition_Access;
Query : Query_Info_Ref.Ref;
Driver : Integer;
end record;
type Query_Loader_Access is access all Query_Loader;
procedure Set_Member (Into : in out Query_Loader;
Field : in Query_Info_Fields;
Value : in Util.Beans.Objects.Object);
-- ------------------------------
-- Called by the de-serialization when a given field is recognized.
-- ------------------------------
procedure Set_Member (Into : in out Query_Loader;
Field : in Query_Info_Fields;
Value : in Util.Beans.Objects.Object) is
use ADO.Drivers;
begin
case Field is
when FIELD_CLASS_NAME =>
Append (Into.Hash_Value, " class=");
Append (Into.Hash_Value, Util.Beans.Objects.To_Unbounded_String (Value));
when FIELD_PROPERTY_TYPE =>
Append (Into.Hash_Value, " type=");
Append (Into.Hash_Value, Util.Beans.Objects.To_Unbounded_String (Value));
when FIELD_PROPERTY_NAME =>
Append (Into.Hash_Value, " name=");
Append (Into.Hash_Value, Util.Beans.Objects.To_Unbounded_String (Value));
when FIELD_QUERY_NAME =>
Into.Query_Def := Find_Query (Into.File.all, Util.Beans.Objects.To_String (Value));
Into.Driver := 0;
if Into.Query_Def /= null then
Into.Query := Query_Info_Ref.Create;
end if;
when FIELD_SQL_DRIVER =>
Into.Driver := Find_Driver (Util.Beans.Objects.To_String (Value));
when FIELD_SQL =>
if not Into.Query.Is_Null and Into.Driver >= 0 and Into.Query_Def /= null then
Set_Query_Pattern (Into.Query.Value.Main_Query (Driver_Index (Into.Driver)),
Value);
end if;
Into.Driver := 0;
when FIELD_SQL_COUNT =>
if not Into.Query.Is_Null and Into.Driver >= 0 and Into.Query_Def /= null then
Set_Query_Pattern (Into.Query.Value.Count_Query (Driver_Index (Into.Driver)),
Value);
end if;
Into.Driver := 0;
when FIELD_QUERY =>
if Into.Query_Def /= null then
-- Now we can safely setup the query info associated with the query definition.
Into.Query_Def.Query.Set (Into.Query);
end if;
Into.Query_Def := null;
end case;
end Set_Member;
package Query_Mapper is
new Util.Serialize.Mappers.Record_Mapper (Element_Type => Query_Loader,
Element_Type_Access => Query_Loader_Access,
Fields => Query_Info_Fields,
Set_Member => Set_Member);
Loader : aliased Query_Loader;
Sql_Mapper : aliased Query_Mapper.Mapper;
Reader : Util.Serialize.IO.XML.Parser;
begin
Log.Info ("Reading XML query {0}", Into.Path.all);
Loader.File := Into;
Loader.Driver := 0;
-- Create the mapping to load the XML query file.
Sql_Mapper.Add_Mapping ("class/@name", FIELD_CLASS_NAME);
Sql_Mapper.Add_Mapping ("class/property/@type", FIELD_PROPERTY_TYPE);
Sql_Mapper.Add_Mapping ("class/property/@name", FIELD_PROPERTY_NAME);
Sql_Mapper.Add_Mapping ("query/@name", FIELD_QUERY_NAME);
Sql_Mapper.Add_Mapping ("query/sql", FIELD_SQL);
Sql_Mapper.Add_Mapping ("query/sql/@driver", FIELD_SQL_DRIVER);
Sql_Mapper.Add_Mapping ("query/sql-count", FIELD_SQL_COUNT);
Sql_Mapper.Add_Mapping ("query", FIELD_QUERY);
Reader.Add_Mapping ("query-mapping", Sql_Mapper'Unchecked_Access);
-- Set the context for Set_Member.
Query_Mapper.Set_Context (Reader, Loader'Access);
-- Read the XML query file.
Reader.Parse (Into.Path.all);
Into.Next_Check := To_Unsigned_32 (Ada.Calendar.Clock) + FILE_CHECK_DELTA_TIME;
exception
when Ada.IO_Exceptions.Name_Error =>
Log.Error ("XML query file '{0}' does not exist", Into.Path.all);
end Read_Query;
-- ------------------------------
-- Read the query definition.
-- ------------------------------
procedure Read_Query (Into : in Query_Definition_Access) is
begin
if Into.Query = null or else Is_Modified (Into) then
Read_Query (Into.File);
end if;
end Read_Query;
-- ------------------------------
-- Initialize the queries to look in the list of directories specified by <b>Paths</b>.
-- Each search directory is separated by ';' (yes, even on Unix).
-- When <b>Load</b> is true, read the XML query file and initialize the query
-- definitions from that file.
-- ------------------------------
procedure Initialize (Paths : in String;
Load : in Boolean) is
procedure Free is
new Ada.Unchecked_Deallocation (Object => String,
Name => Ada.Strings.Unbounded.String_Access);
File : Query_File_Access := Query_Files;
begin
Log.Info ("Initializing query search paths to {0}", Paths);
while File /= null loop
declare
Path : constant String := Util.Files.Find_File_Path (Name => File.Name.all,
Paths => Paths);
Query : Query_Definition_Access := File.Queries;
begin
Free (File.Path);
File.Path := new String '(Path);
-- Allocate the atomic reference for each query.
while Query /= null loop
if Query.Query = null then
Query.Query := new Query_Info_Ref.Atomic_Ref;
end if;
Query := Query.Next;
end loop;
if Load then
Read_Query (File);
end if;
end;
File := File.Next;
end loop;
end Initialize;
-- ------------------------------
-- Find the query identified by the given name.
-- ------------------------------
function Find_Query (Name : in String) return Query_Definition_Access is
File : Query_File_Access := Query_Files;
begin
while File /= null loop
declare
Query : Query_Definition_Access := File.Queries;
begin
while Query /= null loop
if Query.Name.all = Name then
return Query;
end if;
Query := Query.Next;
end loop;
end;
File := File.Next;
end loop;
Log.Warn ("Query {0} not found", Name);
return null;
end Find_Query;
package body Query is
begin
Register (File => File, Query => Query'Access);
end Query;
end ADO.Queries.Loaders;
|
xeenta/learning-ada | Ada | 660 | adb | with Father.Son;
with Ada.Text_IO; use Ada.Text_IO;
procedure Test_Children is
A : Father.Son.Son_Type := 5; -- you can make it constant
B : Father.Father_Type := 100; -- idem
C : constant Father.Son.Sonic_Type := 20;
R : Integer;
--use type Father.Son.Son_Type;
use type Father.Son.Sonic_Type;-- comment this
use type Father.Father_Type; -- comment this
begin
R := Integer (Father.Son."+" (A, B));
Put_Line (Integer'Image (R));
R := Integer (B + A);
Put_Line (Integer'Image (R));
R := C + B; -- comment this
-- R := B + C; --ERR
Put_Line (Integer'Image (R)); -- comment this
end Test_Children;
|
reznikmm/matreshka | Ada | 4,672 | 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.Wrap_Contour_Mode_Attributes is
------------
-- Create --
------------
overriding function Create
(Parameters : not null access Matreshka.DOM_Attributes.Attribute_L2_Parameters)
return Style_Wrap_Contour_Mode_Attribute_Node is
begin
return Self : Style_Wrap_Contour_Mode_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_Wrap_Contour_Mode_Attribute_Node)
return League.Strings.Universal_String
is
pragma Unreferenced (Self);
begin
return Matreshka.ODF_String_Constants.Wrap_Contour_Mode_Attribute;
end Get_Local_Name;
begin
Matreshka.DOM_Documents.Register_Attribute
(Matreshka.ODF_String_Constants.Style_URI,
Matreshka.ODF_String_Constants.Wrap_Contour_Mode_Attribute,
Style_Wrap_Contour_Mode_Attribute_Node'Tag);
end Matreshka.ODF_Style.Wrap_Contour_Mode_Attributes;
|
charlie5/aIDE | Ada | 8,684 | adb | with
aIDE.Editor.of_record_component,
aIDE.GUI,
AdaM.record_Component,
glib.Error,
gtk.Builder,
gtk.Handlers;
with Ada.Text_IO; use Ada.Text_IO;
package body aIDE.Editor.of_record_type
is
use Gtk.Builder,
Glib,
glib.Error;
-- procedure on_index_type_Button_clicked (the_Entry : access Gtk_Button_Record'Class;
-- the_Editor : in aIDE.Editor.of_record_type.view)
-- is
-- begin
-- aIDE.GUI.show_types_Palette (Invoked_by => the_Entry.all'Access,
-- Target => the_Editor.Target.main_Type);
-- end on_index_type_Button_clicked;
procedure on_rid_Button_clicked (the_Button : access Gtk_Button_Record'Class;
the_Editor : in aIDE.Editor.of_record_type.view)
is
pragma Unreferenced (the_Editor);
begin
the_Button.get_Parent.destroy;
end on_rid_Button_clicked;
package Entry_return_Callbacks is new Gtk.Handlers.User_Return_Callback (Gtk_Entry_Record,
Boolean,
AdaM.a_Type.record_type.view);
package Button_Callbacks is new Gtk.Handlers.User_Callback (Gtk_Button_Record,
aIDE.Editor.of_record_type.view);
function on_unconstrained_Label_clicked (the_Label : access Gtk_Label_Record'Class;
Self : in aIDE.Editor.of_record_type.view) return Boolean
is
pragma Unreferenced (the_Label);
begin
-- Self.Target.is_Constrained;
Self.freshen;
return False;
end on_unconstrained_Label_clicked;
function on_constrained_Label_clicked (the_Label : access Gtk_Label_Record'Class;
Self : in aIDE.Editor.of_record_type.view) return Boolean
is
pragma Unreferenced (the_Label);
begin
-- Self.Target.is_Constrained (Now => False);
Self.freshen;
return False;
end on_constrained_Label_clicked;
package Label_return_Callbacks is new Gtk.Handlers.User_Return_Callback (Gtk_Label_Record,
Boolean,
aIDE.Editor.of_record_type.view);
package body Forge
is
function to_Editor (the_Target : in AdaM.a_Type.record_type.view) return View
is
use AdaM,
Glib;
Self : constant Editor.of_record_type.view := new Editor.of_record_type.item;
the_Builder : Gtk_Builder;
Error : aliased GError;
Result : Guint;
pragma Unreferenced (Result);
begin
Self.Target := the_Target;
Gtk_New (the_Builder);
Result := the_Builder.Add_From_File ("glade/editor/record_type_editor.glade", Error'Access);
if Error /= null then
raise Program_Error with "Error: adam.Editor.of_record_type ~ " & Get_Message (Error);
end if;
Self.top_Box := gtk_Box (the_Builder.get_Object ("top_Box"));
Self.name_Entry := Gtk_Entry (the_Builder.get_Object ("name_Entry"));
Self.is_Label := Gtk_Label (the_Builder.get_Object ("is_Label"));
Self.record_Label := Gtk_Label (the_Builder.get_Object ("record_Label"));
Self.components_Box := gtk_Box (the_Builder.get_Object ("components_Box"));
Self.null_Label := Gtk_Label (the_Builder.get_Object ("null_Label"));
Self.end_record_Label := Gtk_Label (the_Builder.get_Object ("end_record_Label"));
Self.rid_Button := gtk_Button (the_Builder.get_Object ("rid_Button"));
Self.name_Entry.set_Text (String (Self.Target.Name));
-- Entry_return_Callbacks.connect (Self.first_Entry,
-- "focus-out-event",
-- on_first_Entry_leave'Access,
-- the_Target);
--
-- Self.last_Entry.set_Text (Self.Target.Last);
--
-- Entry_return_Callbacks.connect (Self.last_Entry,
-- "focus-out-event",
-- on_last_Entry_leave'Access,
-- the_Target);
-- Self.type_Button.set_Label (+Self.Target.main_Type.Name);
--
-- button_Callbacks.connect (Self.type_Button,
-- "clicked",
-- on_index_type_Button_clicked'Access,
-- Self);
-- Button_Callbacks.Connect (Self.rid_Button,
-- "clicked",
-- on_rid_Button_clicked'Access,
-- Self);
-- Label_return_Callbacks.Connect (Self.unconstrained_Label,
-- "button-release-event",
-- on_unconstrained_Label_clicked'Access,
-- Self);
--
-- Label_return_Callbacks.Connect (Self.constrained_Label,
-- "button-release-event",
-- on_constrained_Label_clicked'Access,
-- Self);
Self.freshen;
return Self;
end to_Editor;
end Forge;
procedure destroy_Callback (Widget : not null access Gtk.Widget.Gtk_Widget_Record'Class)
is
begin
Widget.destroy;
end destroy_Callback;
overriding
procedure freshen (Self : in out Item)
is
use gtk.Widget;
-- the_Literals : AdaM.a_Type.enumeration_literal.vector renames Self.Target.Literals;
-- literal_Editor : aIDE.Editor.of_enumeration_literal.view;
Children : AdaM.Entity.Entities renames Self.Target.Children.all;
begin
if Children.is_Empty
then
Self.null_Label.show;
else
Self.null_Label.hide;
end if;
for Each of Children
loop
declare
Child : constant AdaM.record_Component.view := AdaM.record_Component.view (Each);
new_Editor : constant aIDE.Editor.of_record_component.view := Editor.of_record_component.Forge.new_Editor (the_target => Child);
begin
Self.components_Box.pack_Start (new_Editor.top_Widget);
end;
end loop;
-- if Self.is_in_unconstrained_Array
-- then
-- Self.unconstrained_Label.show;
--
-- Self.first_Entry.hide;
-- Self.last_Entry.hide;
-- Self.range_Label.show;
-- Self. constrained_Label.hide;
-- else
-- Self.unconstrained_Label.hide;
-- end if;
-- if Self.is_in_unconstrained_Array
-- then
-- Self.unconstrained_Label.show;
--
-- Self.first_Entry.hide;
-- Self.last_Entry.hide;
-- Self.range_Label.show;
-- Self. constrained_Label.hide;
-- else
-- Self.unconstrained_Label.hide;
--
-- if Self.Target.is_Constrained
-- then
-- Self.range_Label.show;
-- Self. constrained_Label.show;
-- Self.first_Entry.show;
-- Self.last_Entry.show;
-- else
-- Self.range_Label.hide;
-- Self.first_Entry.hide;
-- Self.last_Entry.hide;
-- Self. constrained_Label.hide;
-- Self.unconstrained_Label.hide;
-- end if;
-- end if;
-- Self.first_Entry.set_Text (Self.Target.First);
-- Self.last_Entry .set_Text (Self.Target.Last);
-- Self.literals_Box.Foreach (destroy_Callback'Access);
-- for Each of the_Literals
-- loop
-- literal_Editor := Editor.of_enumeration_literal.Forge.to_Editor (Each,
-- targets_Parent => Self.Target.all'Access);
-- Self.literals_Box.pack_Start (literal_Editor.top_Widget);
-- end loop;
end freshen;
overriding
function top_Widget (Self : in Item) return gtk.Widget.Gtk_Widget
is
begin
return gtk.Widget.Gtk_Widget (Self.top_Box);
end top_Widget;
end aIDE.Editor.of_record_type;
|
reznikmm/matreshka | Ada | 3,927 | ads | ------------------------------------------------------------------------------
-- --
-- Matreshka Project --
-- --
-- Open Document Toolkit --
-- --
-- Runtime Library Component --
-- --
------------------------------------------------------------------------------
-- --
-- Copyright © 2014, Vadim Godunko <[email protected]> --
-- All rights reserved. --
-- --
-- Redistribution and use in source and binary forms, with or without --
-- modification, are permitted provided that the following conditions --
-- are met: --
-- --
-- * Redistributions of source code must retain the above copyright --
-- notice, this list of conditions and the following disclaimer. --
-- --
-- * Redistributions in binary form must reproduce the above copyright --
-- notice, this list of conditions and the following disclaimer in the --
-- documentation and/or other materials provided with the distribution. --
-- --
-- * Neither the name of the Vadim Godunko, IE nor the names of its --
-- contributors may be used to endorse or promote products derived from --
-- this software without specific prior written permission. --
-- --
-- THIS SOFTWARE IS PROVIDED BY THE COPYRIGHT HOLDERS AND CONTRIBUTORS --
-- "AS IS" AND ANY EXPRESS OR IMPLIED WARRANTIES, INCLUDING, BUT NOT --
-- LIMITED TO, THE IMPLIED WARRANTIES OF MERCHANTABILITY AND FITNESS FOR --
-- A PARTICULAR PURPOSE ARE DISCLAIMED. IN NO EVENT SHALL THE COPYRIGHT --
-- HOLDER OR CONTRIBUTORS BE LIABLE FOR ANY DIRECT, INDIRECT, INCIDENTAL, --
-- SPECIAL, EXEMPLARY, OR CONSEQUENTIAL DAMAGES (INCLUDING, BUT NOT LIMITED --
-- TO, PROCUREMENT OF SUBSTITUTE GOODS OR SERVICES; LOSS OF USE, DATA, OR --
-- PROFITS; OR BUSINESS INTERRUPTION) HOWEVER CAUSED AND ON ANY THEORY OF --
-- LIABILITY, WHETHER IN CONTRACT, STRICT LIABILITY, OR TORT (INCLUDING --
-- NEGLIGENCE OR OTHERWISE) ARISING IN ANY WAY OUT OF THE USE OF THIS --
-- SOFTWARE, EVEN IF ADVISED OF THE POSSIBILITY OF SUCH DAMAGE. --
-- --
------------------------------------------------------------------------------
-- $Revision$ $Date$
------------------------------------------------------------------------------
with ODF.DOM.Svg_X1_Attributes;
package Matreshka.ODF_Svg.X1_Attributes is
type Svg_X1_Attribute_Node is
new Matreshka.ODF_Svg.Abstract_Svg_Attribute_Node
and ODF.DOM.Svg_X1_Attributes.ODF_Svg_X1_Attribute
with null record;
overriding function Create
(Parameters : not null access Matreshka.DOM_Attributes.Attribute_L2_Parameters)
return Svg_X1_Attribute_Node;
overriding function Get_Local_Name
(Self : not null access constant Svg_X1_Attribute_Node)
return League.Strings.Universal_String;
end Matreshka.ODF_Svg.X1_Attributes;
|
AdaCore/libadalang | Ada | 193 | adb | procedure Test is
type T is (A, B, C);
X : T;
Y : Integer;
begin
Y := (case X is
when T range A .. B => 1,
when others => 2);
pragma Test_Statement;
end Test;
|
reznikmm/matreshka | Ada | 6,570 | adb | ------------------------------------------------------------------------------
-- --
-- Matreshka Project --
-- --
-- SQL Database Access --
-- --
-- Runtime Library Component --
-- --
------------------------------------------------------------------------------
-- --
-- Copyright © 2011-2013, Vadim Godunko <[email protected]> --
-- All rights reserved. --
-- --
-- Redistribution and use in source and binary forms, with or without --
-- modification, are permitted provided that the following conditions --
-- are met: --
-- --
-- * Redistributions of source code must retain the above copyright --
-- notice, this list of conditions and the following disclaimer. --
-- --
-- * Redistributions in binary form must reproduce the above copyright --
-- notice, this list of conditions and the following disclaimer in the --
-- documentation and/or other materials provided with the distribution. --
-- --
-- * Neither the name of the Vadim Godunko, IE nor the names of its --
-- contributors may be used to endorse or promote products derived from --
-- this software without specific prior written permission. --
-- --
-- THIS SOFTWARE IS PROVIDED BY THE COPYRIGHT HOLDERS AND CONTRIBUTORS --
-- "AS IS" AND ANY EXPRESS OR IMPLIED WARRANTIES, INCLUDING, BUT NOT --
-- LIMITED TO, THE IMPLIED WARRANTIES OF MERCHANTABILITY AND FITNESS FOR --
-- A PARTICULAR PURPOSE ARE DISCLAIMED. IN NO EVENT SHALL THE COPYRIGHT --
-- HOLDER OR CONTRIBUTORS BE LIABLE FOR ANY DIRECT, INDIRECT, INCIDENTAL, --
-- SPECIAL, EXEMPLARY, OR CONSEQUENTIAL DAMAGES (INCLUDING, BUT NOT LIMITED --
-- TO, PROCUREMENT OF SUBSTITUTE GOODS OR SERVICES; LOSS OF USE, DATA, OR --
-- PROFITS; OR BUSINESS INTERRUPTION) HOWEVER CAUSED AND ON ANY THEORY OF --
-- LIABILITY, WHETHER IN CONTRACT, STRICT LIABILITY, OR TORT (INCLUDING --
-- NEGLIGENCE OR OTHERWISE) ARISING IN ANY WAY OUT OF THE USE OF THIS --
-- SOFTWARE, EVEN IF ADVISED OF THE POSSIBILITY OF SUCH DAMAGE. --
-- --
------------------------------------------------------------------------------
-- $Revision$ $Date$
------------------------------------------------------------------------------
package body Matreshka.Internals.SQL_Drivers.Dummy is
-----------------
-- Bound_Value --
-----------------
overriding function Bound_Value
(Self : not null access Dummy_Query;
Name : League.Strings.Universal_String)
return League.Holders.Holder
is
pragma Unreferenced (Self);
pragma Unreferenced (Name);
begin
return League.Holders.Empty_Holder;
end Bound_Value;
-------------------
-- Error_Message --
-------------------
overriding function Error_Message
(Self : not null access Dummy_Database)
return League.Strings.Universal_String
is
pragma Unreferenced (Self);
begin
return League.Strings.To_Universal_String ("Database driver not defined");
end Error_Message;
-------------------
-- Error_Message --
-------------------
overriding function Error_Message
(Self : not null access Dummy_Query)
return League.Strings.Universal_String
is
pragma Unreferenced (Self);
begin
return League.Strings.To_Universal_String ("Database driver not defined");
end Error_Message;
-------------
-- Execute --
-------------
overriding function Execute
(Self : not null access Dummy_Query) return Boolean
is
pragma Unreferenced (Self);
begin
return False;
end Execute;
---------------
-- Is_Active --
---------------
overriding function Is_Active
(Self : not null access Dummy_Query) return Boolean
is
pragma Unreferenced (Self);
begin
return False;
end Is_Active;
--------------
-- Is_Valid --
--------------
overriding function Is_Valid
(Self : not null access Dummy_Query) return Boolean
is
pragma Unreferenced (Self);
begin
return False;
end Is_Valid;
----------
-- Next --
----------
overriding function Next
(Self : not null access Dummy_Query) return Boolean
is
pragma Unreferenced (Self);
begin
return False;
end Next;
----------
-- Open --
----------
overriding function Open
(Self : not null access Dummy_Database;
Options : SQL.Options.SQL_Options) return Boolean
is
pragma Unreferenced (Self);
pragma Unreferenced (Options);
begin
return False;
end Open;
-------------
-- Prepare --
-------------
overriding function Prepare
(Self : not null access Dummy_Query;
Query : League.Strings.Universal_String) return Boolean
is
pragma Unreferenced (Self);
pragma Unreferenced (Query);
begin
return False;
end Prepare;
-----------
-- Query --
-----------
overriding function Query
(Self : not null access Dummy_Database) return not null Query_Access
is
pragma Unreferenced (Self);
begin
return Empty_Query'Access;
end Query;
-----------
-- Value --
-----------
overriding function Value
(Self : not null access Dummy_Query;
Index : Positive) return League.Holders.Holder
is
pragma Unreferenced (Self);
pragma Unreferenced (Index);
begin
return League.Holders.Empty_Holder;
end Value;
end Matreshka.Internals.SQL_Drivers.Dummy;
|
Gabriel-Degret/adalib | Ada | 1,289 | ads | -- Standard Ada library specification
-- Copyright (c) 2004-2016 AXE Consultants
-- Copyright (c) 2004, 2005, 2006 Ada-Europe
-- Copyright (c) 2000 The MITRE Corporation, Inc.
-- Copyright (c) 1992, 1993, 1994, 1995 Intermetrics, Inc.
-- SPDX-License-Identifier: BSD-3-Clause and LicenseRef-AdaReferenceManual
---------------------------------------------------------------------------
package Ada.Strings.UTF_Encoding.Wide_Strings is
pragma Pure (Wide_Strings);
-- Encoding / decoding between Wide_String and various encoding schemes
function Encode (Item : Wide_String;
Output_Scheme : Encoding_Scheme;
Output_BOM : Boolean := False) return UTF_String;
function Encode (Item : Wide_String;
Output_BOM : Boolean := False) return UTF_8_String;
function Encode (Item : Wide_String;
Output_BOM : Boolean := False)
return UTF_16_Wide_String;
function Decode (Item : UTF_String;
Input_Scheme : Encoding_Scheme) return Wide_String;
function Decode (Item : UTF_8_String) return Wide_String;
function Decode (Item : UTF_16_Wide_String) return Wide_String;
end Ada.Strings.UTF_Encoding.Wide_Strings;
|
zrmyers/VulkanAda | Ada | 8,338 | ads | --------------------------------------------------------------------------------
-- MIT License
--
-- Copyright (c) 2021 Zane Myers
--
-- 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 Vulkan.Math.GenDMatrix;
with Vulkan.Math.Dvec4;
use Vulkan.Math.GenDMatrix;
use Vulkan.Math.Dvec4;
--------------------------------------------------------------------------------
--< @group Vulkan Math Basic Types
--------------------------------------------------------------------------------
--< @summary
--< This package provides a single precision floating point matrix with 3 rows
--< and 3 columns.
--------------------------------------------------------------------------------
package Vulkan.Math.Dmat4x4 is
pragma Preelaborate;
pragma Pure;
--< A 4x4 matrix of single-precision floating point numbers.
subtype Vkm_Dmat4x4 is Vkm_Dmat(
last_row_index => 3, last_column_index => 3);
--< An alternative name for a 4x4 single-precision floating point matrix
subtype Vkm_Dmat4 is Vkm_Dmat4x4;
----------------------------------------------------------------------------
--< @summary
--< Constructor for Vkm_Dmat4x4 type.
--<
--< @description
--< Construct a 4x4 matrix with each component set to the corresponding
--< component in the identity matrix.
--<
--< @return
--< A 4x4 matrix.
----------------------------------------------------------------------------
function Make_Dmat4x4 return Vkm_Dmat4x4 is
(GDM.Make_GenMatrix(cN => 3, rN => 3, diag => 1.0)) with Inline;
----------------------------------------------------------------------------
--< @summary
--< Constructor for Vkm_Dmat4x4 type.
--<
--< @description
--< Construct a 4x4 matrix with each component on the diagonal set to a
--< particular value.
--<
--< @param diag
--< The value to set along the diagonal.
--<
--< @return
--< A 4x4 matrix.
----------------------------------------------------------------------------
function Make_Dmat4x4 (
diag : in Vkm_Double) return Vkm_Dmat4x4 is
(GDM.Make_GenMatrix(cN => 3, rN => 3, diag => diag)) with Inline;
----------------------------------------------------------------------------
--< @summary
--< Constructor for Vkm_Dmat4x4 type.
--<
--< @description
--< Construct a 4x4 matrix with each component on the diagonal set to a
--< particular value from a vector.
--<
--< @param diag
--< The value to set along the diagonal.
--<
--< @return
--< A 4x4 matrix.
----------------------------------------------------------------------------
function Make_Dmat4x4 (
diag : in Vkm_Dvec4) return Vkm_Dmat4x4 is
(GDM.Make_GenMatrix(cN => 3, rN => 3, diag => diag)) with Inline;
----------------------------------------------------------------------------
--< @summary
--< Constructor for Vkm_Dmat4x4 type.
--<
--< @description
--< Construct a 4x4 matrix with each component set to a different value.
--<
--< @param value1
--< The first value to set for the matrix.
--<
--< @param value2
--< The second value to set for the matrix.
--<
--< @param value3
--< The third value to set for the matrix.
--<
--< @param value4
--< The fourth value to set for the matrix.
--<
--< @param value5
--< The fifth value to set for the matrix.
--<
--< @param value6
--< The sixth value to set for the matrix.
--<
--< @param value7
--< The seventh value to set for the matrix.
--<
--< @param value8
--< The eighth value to set for the matrix.
--<
--< @param value9
--< The ninth value to set for the matrix.
--<
--< @return
--< A 4x4 matrix.
----------------------------------------------------------------------------
function Make_Dmat4x4 (
value1 , value2 , value3 , value4 ,
value5 , value6 , value7 , value8 ,
value9 , value10, value11, value12,
value13, value14, value15, value16 : in Vkm_Double) return Vkm_Dmat4x4 is
(GDM.Make_GenMatrix(
cN => 3, rN => 3,
c0r0_val => value1, c0r1_val => value5, c0r2_val => value9 , c0r3_val => value13,
c1r0_val => value2, c1r1_val => value6, c1r2_val => value10, c1r3_val => value14,
c2r0_val => value3, c2r1_val => value7, c2r2_val => value11, c2r3_val => value15,
c3r0_val => value4, c3r1_val => value8, c3r2_val => value12, c3r3_val => value16)) with Inline;
----------------------------------------------------------------------------
--< @summary
--< Constructor for Vkm_Dmat4x4 type.
--<
--< @description
--< Construct a 4x4 matrix with each column set to the value of a 2 dimmensional
--< vector.
--<
--< @param value1
--< The first value to set for the matrix.
--<
--< @param value2
--< The second value to set for the matrix.
--<
--< @return
--< A 4x4 matrix.
----------------------------------------------------------------------------
function Make_Dmat4x4 (
value1, value2, value3, value4 : in Vkm_Dvec4) return Vkm_Dmat4x4 is
(GDM.Make_GenMatrix(
cN => 3, rN => 3,
c0r0_val => value1.x, c0r1_val => value2.x, c0r2_val => value3.x, c0r3_val => value4.x,
c1r0_val => value1.y, c1r1_val => value2.y, c1r2_val => value3.y, c1r3_val => value4.y,
c2r0_val => value1.z, c2r1_val => value2.z, c2r2_val => value3.z, c2r3_val => value4.z,
c3r0_val => value1.w, c3r1_val => value2.w, c3r2_val => value3.w, c3r3_val => value4.w)) with Inline;
----------------------------------------------------------------------------
--< @summary
--< Constructor for Vkm_Dmat4x4 type.
--<
--< @description
--< Construct a 4x4 matrix using values from an existing matrix.
--<
--< If the provided matrix has dimmensions that are not the same as this
--< matrix, the corresponding element in the 4x4 identity matrix is used for
--< out of bounds accesses.
--<
--< @param value1
--< The submatrix to extract values from.
--<
--< @return
--< A 4x4 matrix.
----------------------------------------------------------------------------
function Make_Dmat4x4 (
value1 : in Vkm_Dmat) return Vkm_Dmat4x4 is
(GDM.Make_GenMatrix(
cN => 3, rN => 3,
c0r0_val => value1.c0r0, c0r1_val => value1.c0r1, c0r2_val => value1.c0r2, c0r3_val => value1.c0r3,
c1r0_val => value1.c1r0, c1r1_val => value1.c1r1, c1r2_val => value1.c1r2, c1r3_val => value1.c1r3,
c2r0_val => value1.c2r0, c2r1_val => value1.c2r1, c2r2_val => value1.c2r2, c2r3_val => value1.c2r3,
c3r0_val => value1.c3r0, c3r1_val => value1.c3r1, c3r2_val => value1.c3r2, c3r3_val => value1.c3r3)) with Inline;
end Vulkan.Math.Dmat4x4;
|
godunko/adawebui | Ada | 4,322 | ads | ------------------------------------------------------------------------------
-- --
-- Matreshka Project --
-- --
-- Web Framework --
-- --
-- Runtime Library Component --
-- --
------------------------------------------------------------------------------
-- --
-- Copyright © 2017-2020, Vadim Godunko <[email protected]> --
-- All rights reserved. --
-- --
-- Redistribution and use in source and binary forms, with or without --
-- modification, are permitted provided that the following conditions --
-- are met: --
-- --
-- * Redistributions of source code must retain the above copyright --
-- notice, this list of conditions and the following disclaimer. --
-- --
-- * Redistributions in binary form must reproduce the above copyright --
-- notice, this list of conditions and the following disclaimer in the --
-- documentation and/or other materials provided with the distribution. --
-- --
-- * Neither the name of the Vadim Godunko, IE nor the names of its --
-- contributors may be used to endorse or promote products derived from --
-- this software without specific prior written permission. --
-- --
-- THIS SOFTWARE IS PROVIDED BY THE COPYRIGHT HOLDERS AND CONTRIBUTORS --
-- "AS IS" AND ANY EXPRESS OR IMPLIED WARRANTIES, INCLUDING, BUT NOT --
-- LIMITED TO, THE IMPLIED WARRANTIES OF MERCHANTABILITY AND FITNESS FOR --
-- A PARTICULAR PURPOSE ARE DISCLAIMED. IN NO EVENT SHALL THE COPYRIGHT --
-- HOLDER OR CONTRIBUTORS BE LIABLE FOR ANY DIRECT, INDIRECT, INCIDENTAL, --
-- SPECIAL, EXEMPLARY, OR CONSEQUENTIAL DAMAGES (INCLUDING, BUT NOT LIMITED --
-- TO, PROCUREMENT OF SUBSTITUTE GOODS OR SERVICES; LOSS OF USE, DATA, OR --
-- PROFITS; OR BUSINESS INTERRUPTION) HOWEVER CAUSED AND ON ANY THEORY OF --
-- LIABILITY, WHETHER IN CONTRACT, STRICT LIABILITY, OR TORT (INCLUDING --
-- NEGLIGENCE OR OTHERWISE) ARISING IN ANY WAY OUT OF THE USE OF THIS --
-- SOFTWARE, EVEN IF ADVISED OF THE POSSIBILITY OF SUCH DAMAGE. --
-- --
------------------------------------------------------------------------------
-- $Revision: 5726 $ $Date: 2017-01-26 00:26:30 +0300 (Thu, 26 Jan 2017) $
------------------------------------------------------------------------------
--with Core.Slots_0;
--private with Core.Slots_0.Emitters;
package Web.UI.Widgets.Buttons is
type Abstract_Button is
abstract new Web.UI.Widgets.Abstract_Widget with private;
-- not overriding function Clicked_Signal
-- (Self : in out Abstract_Button)
-- return not null access Core.Slots_0.Signal'Class;
package Constructors is
procedure Initialize
(Self : in out Abstract_Button'Class;
Element : Web.HTML.Elements.HTML_Element'Class);
end Constructors;
private
type Abstract_Button is
abstract new Web.UI.Widgets.Abstract_Widget with record
null;
-- Clicked : aliased Core.Slots_0.Emitters.Emitter
-- (Abstract_Button'Unchecked_Access);
end record;
-- overriding procedure Click_Event
-- (Self : in out Abstract_Button;
-- Event : in out WUI.Events.Mouse.Click.Click_Event'Class);
end Web.UI.Widgets.Buttons;
|
renekroka/Amass | Ada | 1,886 | ads | -- Copyright 2017 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 = "SecurityTrails"
type = "api"
function start()
setratelimit(1)
end
function vertical(ctx, domain)
if (api == nil or api.key == "") then
return
end
local page, err = request({
url=verturl(domain),
headers={
APIKEY=api.key,
['Content-Type']="application/json",
},
})
if (err ~= nil and err ~= "") then
return
end
local j = json.decode(page)
if (j == nil or #(j.subdomains) == 0) then
return
end
for i, sub in pairs(j.subdomains) do
sendnames(ctx, sub .. "." .. domain)
end
end
function verturl(domain)
return "https://api.securitytrails.com/v1/domain/" .. domain .. "/subdomains"
end
function sendnames(ctx, content)
local names = find(content, subdomainre)
if names == nil then
return
end
for i, v in pairs(names) do
newname(ctx, v)
end
end
function horizontal(ctx, domain)
if (api == nil or api.key == "") then
return
end
local page, err = request({
url=horizonurl(domain),
headers={
APIKEY=api.key,
['Content-Type']="application/json",
},
})
if (err ~= nil and err ~= "") then
return
end
local j = json.decode(page)
if (j == nil or #(j.records) == 0) then
return
end
assoc = {}
for i, r in pairs(j.records) do
if r.hostname ~= "" then
table.insert(assoc, r.hostname)
end
end
for i, a in pairs(assoc) do
associated(ctx, domain, a)
end
end
function horizonurl(domain)
return "https://api.securitytrails.com/v1/domain/" .. domain .. "/associated"
end
|
landgraf/nanomsg-ada | Ada | 2,435 | adb | -- The MIT License (MIT)
-- Copyright (c) 2015 Pavel Zhukov <[email protected]>
-- Permission is hereby granted, free of charge, to any person obtaining a copy
-- of this software and associated documentation files (the "Software"), to deal
-- in the Software without restriction, including without limitation the rights
-- to use, copy, modify, merge, publish, distribute, sublicense, and/or sell
-- copies of the Software, and to permit persons to whom the Software is
-- furnished to do so, subject to the following conditions:
-- The above copyright notice and this permission notice shall be included in all
-- copies or substantial portions of the Software.
-- THE SOFTWARE IS PROVIDED "AS IS", WITHOUT WARRANTY OF ANY KIND, EXPRESS OR
-- IMPLIED, INCLUDING BUT NOT LIMITED TO THE WARRANTIES OF MERCHANTABILITY,
-- FITNESS FOR A PARTICULAR PURPOSE AND NONINFRINGEMENT. IN NO EVENT SHALL THE
-- AUTHORS OR COPYRIGHT HOLDERS BE LIABLE FOR ANY CLAIM, DAMAGES OR OTHER
-- LIABILITY, WHETHER IN AN ACTION OF CONTRACT, TORT OR OTHERWISE, ARISING FROM,
-- OUT OF OR IN CONNECTION WITH THE SOFTWARE OR THE USE OR OTHER DEALINGS IN THE
-- SOFTWARE.
with Aunit.Test_Suites; use Aunit.Test_Suites;
with Nanomsg.Test_Socket_Create_Close;
with Nanomsg.Test_Socket_Bind_Connect;
with Nanomsg.Test_Message_Send_Receive;
with Nanomsg.Test_Send_Binary_File;
with Nanomsg.Test_Message_Long_Text;
with Nanomsg.Test_Message_Text_Convert;
with Nanomsg.Test_Req_Rep;
with Nanomsg.Test_Pair;
with Nanomsg.Test_Pub_sub;
with Nanomsg.Test_Survey;
with Nanomsg.Test_Socket_Name;
with Nanomsg.Test_Message_Send_Receive_Million;
function Test_Suite return Access_Test_Suite is
TS_Ptr : constant Access_Test_Suite := new Aunit.Test_Suites.Test_Suite;
begin
Ts_Ptr.Add_Test (new Nanomsg.Test_Socket_Create_Close.Tc);
Ts_Ptr.Add_Test (new Nanomsg.Test_Socket_Name.Tc);
Ts_Ptr.Add_Test (new Nanomsg.Test_Socket_Bind_Connect.Tc);
Ts_Ptr.Add_Test (new Nanomsg.Test_Message_Text_Convert.Tc);
Ts_Ptr.Add_Test (new Nanomsg.Test_Message_Long_Text.Tc);
Ts_Ptr.Add_Test (new Nanomsg.Test_Message_Send_Receive.Tc);
Ts_Ptr.Add_Test (new Nanomsg.Test_Req_Rep.Tc);
Ts_Ptr.Add_Test (new Nanomsg.Test_Pair.Tc);
Ts_Ptr.Add_Test (new Nanomsg.Test_Pub_Sub.Tc);
Ts_Ptr.Add_Test (new Nanomsg.Test_Survey.Tc);
Ts_Ptr.Add_Test (new Nanomsg.Test_Message_Send_Receive_Million.Tc);
return Ts_Ptr;
end Test_Suite;
|
persan/A-gst | Ada | 4,956 | ads | pragma Ada_2005;
pragma Style_Checks (Off);
pragma Warnings (Off);
with Interfaces.C; use Interfaces.C;
with glib;
with glib.Values;
with System;
with GStreamer.GST_Low_Level.gstreamer_0_10_gst_base_gstbasetransform_h;
with GStreamer.GST_Low_Level.gstreamer_0_10_gst_audio_gstringbuffer_h;
with glib;
limited with GStreamer.GST_Low_Level.gstreamer_0_10_gst_gstcaps_h;
package GStreamer.GST_Low_Level.gstreamer_0_10_gst_audio_gstaudiofilter_h is
-- unsupported macro: GST_TYPE_AUDIO_FILTER (gst_audio_filter_get_type())
-- arg-macro: function GST_AUDIO_FILTER (obj)
-- return G_TYPE_CHECK_INSTANCE_CAST((obj),GST_TYPE_AUDIO_FILTER,GstAudioFilter);
-- arg-macro: function GST_AUDIO_FILTER_CAST (obj)
-- return (GstAudioFilter *) (obj);
-- arg-macro: function GST_AUDIO_FILTER_CLASS (klass)
-- return G_TYPE_CHECK_CLASS_CAST((klass),GST_TYPE_AUDIO_FILTER,GstAudioFilterClass);
-- arg-macro: function GST_AUDIO_FILTER_CLASS_CAST (klass)
-- return (GstAudioFilterClass *) (klass);
-- arg-macro: function GST_IS_AUDIO_FILTER (obj)
-- return G_TYPE_CHECK_INSTANCE_TYPE((obj),GST_TYPE_AUDIO_FILTER);
-- arg-macro: function GST_IS_AUDIO_FILTER_CLASS (klass)
-- return G_TYPE_CHECK_CLASS_TYPE((klass),GST_TYPE_AUDIO_FILTER);
-- GStreamer
-- * Copyright (C) <1999> Erik Walthinsen <[email protected]>
-- *
-- * This library is free software; you can redistribute it and/or
-- * modify it under the terms of the GNU Library General Public
-- * License as published by the Free Software Foundation; either
-- * version 2 of the License, or (at your option) any later version.
-- *
-- * This library is distributed in the hope that it will be useful,
-- * but WITHOUT ANY WARRANTY; without even the implied warranty of
-- * MERCHANTABILITY or FITNESS FOR A PARTICULAR PURPOSE. See the GNU
-- * Library General Public License for more details.
-- *
-- * You should have received a copy of the GNU Library General Public
-- * License along with this library; if not, write to the
-- * Free Software Foundation, Inc., 59 Temple Place - Suite 330,
-- * Boston, MA 02111-1307, USA.
--
type GstAudioFilter;
type u_GstAudioFilter_u_gst_reserved_array is array (0 .. 3) of System.Address;
--subtype GstAudioFilter is u_GstAudioFilter; -- gst/audio/gstaudiofilter.h:30
type GstAudioFilterClass;
type u_GstAudioFilterClass_u_gst_reserved_array is array (0 .. 3) of System.Address;
--subtype GstAudioFilterClass is u_GstAudioFilterClass; -- gst/audio/gstaudiofilter.h:31
--*
-- * GstAudioFilter:
-- *
-- * Base class for audio filters with the same format for input and output.
-- *
-- * Since: 0.10.12
--
type GstAudioFilter is record
basetransform : aliased GStreamer.GST_Low_Level.gstreamer_0_10_gst_base_gstbasetransform_h.GstBaseTransform; -- gst/audio/gstaudiofilter.h:56
format : aliased GStreamer.GST_Low_Level.gstreamer_0_10_gst_audio_gstringbuffer_h.GstRingBufferSpec; -- gst/audio/gstaudiofilter.h:59
u_gst_reserved : u_GstAudioFilter_u_gst_reserved_array; -- gst/audio/gstaudiofilter.h:62
end record;
pragma Convention (C_Pass_By_Copy, GstAudioFilter); -- gst/audio/gstaudiofilter.h:55
--< protected >
-- currently configured format
--< private >
--*
-- * GstAudioFilterClass:
-- * @basetransformclass: parent class
-- * @setup: virtual function called whenever the format changes
-- *
-- * In addition to the @setup virtual function, you should also override the
-- * GstBaseTransform::transform and/or GstBaseTransform::transform_ip virtual
-- * function.
-- *
-- * Since: 0.10.12
--
type GstAudioFilterClass is record
basetransformclass : aliased GStreamer.GST_Low_Level.gstreamer_0_10_gst_base_gstbasetransform_h.GstBaseTransformClass; -- gst/audio/gstaudiofilter.h:78
setup : access function (arg1 : access GstAudioFilter; arg2 : access GStreamer.GST_Low_Level.gstreamer_0_10_gst_audio_gstringbuffer_h.GstRingBufferSpec) return GLIB.gboolean; -- gst/audio/gstaudiofilter.h:81
u_gst_reserved : u_GstAudioFilterClass_u_gst_reserved_array; -- gst/audio/gstaudiofilter.h:84
end record;
pragma Convention (C_Pass_By_Copy, GstAudioFilterClass); -- gst/audio/gstaudiofilter.h:77
-- virtual function, called whenever the format changes
--< private >
function gst_audio_filter_get_type return GLIB.GType; -- gst/audio/gstaudiofilter.h:87
pragma Import (C, gst_audio_filter_get_type, "gst_audio_filter_get_type");
procedure gst_audio_filter_class_add_pad_templates (klass : access GstAudioFilterClass; allowed_caps : access constant GStreamer.GST_Low_Level.gstreamer_0_10_gst_gstcaps_h.GstCaps); -- gst/audio/gstaudiofilter.h:89
pragma Import (C, gst_audio_filter_class_add_pad_templates, "gst_audio_filter_class_add_pad_templates");
end GStreamer.GST_Low_Level.gstreamer_0_10_gst_audio_gstaudiofilter_h;
|
AdaCore/Ada_Drivers_Library | Ada | 2,539 | ads | ------------------------------------------------------------------------------
-- --
-- Copyright (C) 2015, AdaCore --
-- --
-- Redistribution and use in source and binary forms, with or without --
-- modification, are permitted provided that the following conditions are --
-- met: --
-- 1. Redistributions of source code must retain the above copyright --
-- notice, this list of conditions and the following disclaimer. --
-- 2. Redistributions in binary form must reproduce the above copyright --
-- notice, this list of conditions and the following disclaimer in --
-- the documentation and/or other materials provided with the --
-- distribution. --
-- 3. Neither the name of the copyright holder nor the names of its --
-- contributors may be used to endorse or promote products derived --
-- from this software without specific prior written permission. --
-- --
-- THIS SOFTWARE IS PROVIDED BY THE COPYRIGHT HOLDERS AND CONTRIBUTORS --
-- "AS IS" AND ANY EXPRESS OR IMPLIED WARRANTIES, INCLUDING, BUT NOT --
-- LIMITED TO, THE IMPLIED WARRANTIES OF MERCHANTABILITY AND FITNESS FOR --
-- A PARTICULAR PURPOSE ARE DISCLAIMED. IN NO EVENT SHALL THE COPYRIGHT --
-- HOLDER OR CONTRIBUTORS BE LIABLE FOR ANY DIRECT, INDIRECT, INCIDENTAL, --
-- SPECIAL, EXEMPLARY, OR CONSEQUENTIAL DAMAGES (INCLUDING, BUT NOT --
-- LIMITED TO, PROCUREMENT OF SUBSTITUTE GOODS OR SERVICES; LOSS OF USE, --
-- DATA, OR PROFITS; OR BUSINESS INTERRUPTION) HOWEVER CAUSED AND ON ANY --
-- THEORY OF LIABILITY, WHETHER IN CONTRACT, STRICT LIABILITY, OR TORT --
-- (INCLUDING NEGLIGENCE OR OTHERWISE) ARISING IN ANY WAY OUT OF THE USE --
-- OF THIS SOFTWARE, EVEN IF ADVISED OF THE POSSIBILITY OF SUCH DAMAGE. --
-- --
------------------------------------------------------------------------------
-- DMA2D driver that polls the DMA2D status to check for finished DMA
-- transfers
package STM32.DMA2D.Polling is
procedure Initialize;
end STM32.DMA2D.Polling;
|
stcarrez/swagger-ada | Ada | 2,069 | adb | -----------------------------------------------------------------------
-- openapi-server-operation -- Rest server operation
-- Copyright (C) 2017, 2018, 2019, 2022 Stephane Carrez
-- Written by Stephane Carrez ([email protected])
--
-- Licensed under the Apache License, Version 2.0 (the "License");
-- you may not use this file except in compliance with the License.
-- You may obtain a copy of the License at
--
-- http://www.apache.org/licenses/LICENSE-2.0
--
-- Unless required by applicable law or agreed to in writing, software
-- distributed under the License is distributed on an "AS IS" BASIS,
-- WITHOUT WARRANTIES OR CONDITIONS OF ANY KIND, either express or implied.
-- See the License for the specific language governing permissions and
-- limitations under the License.
-----------------------------------------------------------------------
with Servlet.Rest.Operation;
package body OpenAPI.Servers.Operation is
procedure Op (Req : in out OpenAPI.Servers.Request'Class;
Reply : in out OpenAPI.Servers.Response'Class;
Stream : in out OpenAPI.Servers.Output_Stream'Class);
procedure Op (Req : in out OpenAPI.Servers.Request'Class;
Reply : in out OpenAPI.Servers.Response'Class;
Stream : in out OpenAPI.Servers.Output_Stream'Class) is
Ctx : Context_Type;
begin
Ctx.Initialize (Req, Reply, Stream);
Handler (Req, Reply, Stream, Ctx);
exception
when others =>
Ctx.Set_Error (500, "Internal server error");
end Op;
package API is new Servlet.Rest.Operation (Handler => Op'Access,
Method => Method,
URI => URI,
Permission => Permission,
Mimes => Mimes);
function Definition return Descriptor_Access is
begin
return API.Definition;
end Definition;
end OpenAPI.Servers.Operation;
|
simonjwright/sdlada | Ada | 7,578 | adb | --------------------------------------------------------------------------------------------------------------------
-- Copyright (c) 2013-2020, Luke A. Guest
--
-- This software is provided 'as-is', without any express or implied
-- warranty. In no event will the authors be held liable for any damages
-- arising from the use of this software.
--
-- Permission is granted to anyone to use this software for any purpose,
-- including commercial applications, and to alter it and redistribute it
-- freely, subject to the following restrictions:
--
-- 1. The origin of this software must not be misrepresented; you must not
-- claim that you wrote the original software. If you use this software
-- in a product, an acknowledgment in the product documentation would be
-- appreciated but is not required.
--
-- 2. Altered source versions must be plainly marked as such, and must not be
-- misrepresented as being the original software.
--
-- 3. This notice may not be removed or altered from any source
-- distribution.
--------------------------------------------------------------------------------------------------------------------
with Ada.Finalization;
with System.Address_To_Access_Conversions;
package body SDL.Video.Surfaces.Makers is
procedure Create (Self : in out Surface;
Size : in SDL.Sizes;
BPP : in Pixel_Depths;
Red_Mask : in Colour_Masks;
Blue_Mask : in Colour_Masks;
Green_Mask : in Colour_Masks;
Alpha_Mask : in Colour_Masks) is
function SDL_Create_RGB_Surface
(Flags : in Surface_Flags := 0; -- TODO: Is this the correct type?
Width : in C.int := 0;
Height : in C.int := 0;
Depth : in Pixel_Depths := 1;
Red_Mask : in Colour_Masks := 0;
Green_Mask : in Colour_Masks := 0;
Blue_Mask : in Colour_Masks := 0;
Alpha_Mask : in Colour_Masks := 0) return Internal_Surface_Pointer with
Import => True,
Convention => C,
External_Name => "SDL_CreateRGBSurface";
begin
Self.Internal := SDL_Create_RGB_Surface (Width => Size.Width,
Height => Size.Height,
Depth => BPP,
Red_Mask => Red_Mask,
Green_Mask => Green_Mask,
Blue_Mask => Blue_Mask,
Alpha_Mask => Alpha_Mask);
end Create;
procedure Create_From (Self : in out Surface;
Pixels : in Element_Pointer;
Size : in SDL.Sizes;
BPP : in Pixel_Depths := Element'Size;
Pitch : in System.Storage_Elements.Storage_Offset;
Red_Mask : in Colour_Masks;
Green_Mask : in Colour_Masks;
Blue_Mask : in Colour_Masks;
Alpha_Mask : in Colour_Masks) is
type Element_Pointer_C is access all Element with Convention => C;
function SDL_Create_RGB_Surface_From
(Pixels : in Element_Pointer_C;
Width : in C.int := 0;
Height : in C.int := 0;
Depth : in Pixel_Depths := 1;
Pitch : in C.int := 0;
Red_Mask : in Colour_Masks := 0;
Green_Mask : in Colour_Masks := 0;
Blue_Mask : in Colour_Masks := 0;
Alpha_Mask : in Colour_Masks := 0) return Internal_Surface_Pointer with
Import => True,
Convention => C,
External_Name => "SDL_CreateRGBSurfaceFrom";
begin
Self.Internal := SDL_Create_RGB_Surface_From (Pixels => Element_Pointer_C (Pixels),
Width => Size.Width,
Height => Size.Height,
Depth => BPP,
Pitch => C.int (Pitch),
Red_Mask => Red_Mask,
Green_Mask => Green_Mask,
Blue_Mask => Blue_Mask,
Alpha_Mask => Alpha_Mask);
end Create_From;
procedure Create_From_Array (Self : in out Surface;
Pixels : access Element_Array;
Red_Mask : in Colour_Masks;
Green_Mask : in Colour_Masks;
Blue_Mask : in Colour_Masks;
Alpha_Mask : in Colour_Masks) is
type Element_Pointer_C is access all Element with Convention => C;
package Convert is new System.Address_To_Access_Conversions (Element);
function SDL_Create_RGB_Surface_From
(Pixels : in Element_Pointer_C; -- Note: using System.Address here is not portable
Width : in C.int := 0;
Height : in C.int := 0;
Depth : in Pixel_Depths := 1;
Pitch : in C.int := 0;
Red_Mask : in Colour_Masks := 0;
Green_Mask : in Colour_Masks := 0;
Blue_Mask : in Colour_Masks := 0;
Alpha_Mask : in Colour_Masks := 0) return Internal_Surface_Pointer with
Import => True,
Convention => C,
External_Name => "SDL_CreateRGBSurfaceFrom";
use System.Storage_Elements;
Pitch : constant Storage_Offset := Pixels (Index'Succ (Pixels'First (1)), Pixels'First (2))'Address
- Pixels (Pixels'First (1), Pixels'First (2))'Address;
begin
Self.Internal := SDL_Create_RGB_Surface_From (
Pixels => Element_Pointer_C (Convert.To_Pointer (Pixels (Pixels'First (1), Pixels'First (2))'Address)),
Width => Pixels'Length (2),
Height => Pixels'Length (1),
Depth => Element'Size,
Pitch => C.int (Pitch),
Red_Mask => Red_Mask,
Green_Mask => Green_Mask,
Blue_Mask => Blue_Mask,
Alpha_Mask => Alpha_Mask);
end Create_From_Array;
-- TODO: SDL_CreateRGBSurfaceFrom
-- procedure Create (Self : in out Surface; File_Name : in String) is
-- -- This is actually a macro in the header.
-- function SDL_Load_BMP (File_Name : in C.char_array) return Internal_Surface_Pointer with
-- Import => True,
-- Convention => C,
-- External_Name => "SDL_LoadBMP";
-- begin
-- Self.Internal := SDL_Load_BMP (C.To_C (File_Name));
-- end Create;
function Get_Internal_Surface (Self : in Surface) return Internal_Surface_Pointer is
begin
return Self.Internal;
end Get_Internal_Surface;
function Make_Surface_From_Pointer (S : in Internal_Surface_Pointer; Owns : in Boolean := False) return Surface is
begin
return (Ada.Finalization.Controlled with Internal => S, Owns => Owns);
end Make_Surface_From_Pointer;
end SDL.Video.Surfaces.Makers;
|
reznikmm/matreshka | Ada | 3,961 | ads | ------------------------------------------------------------------------------
-- --
-- Matreshka Project --
-- --
-- Open Document Toolkit --
-- --
-- Runtime Library Component --
-- --
------------------------------------------------------------------------------
-- --
-- Copyright © 2014, Vadim Godunko <[email protected]> --
-- All rights reserved. --
-- --
-- Redistribution and use in source and binary forms, with or without --
-- modification, are permitted provided that the following conditions --
-- are met: --
-- --
-- * Redistributions of source code must retain the above copyright --
-- notice, this list of conditions and the following disclaimer. --
-- --
-- * Redistributions in binary form must reproduce the above copyright --
-- notice, this list of conditions and the following disclaimer in the --
-- documentation and/or other materials provided with the distribution. --
-- --
-- * Neither the name of the Vadim Godunko, IE nor the names of its --
-- contributors may be used to endorse or promote products derived from --
-- this software without specific prior written permission. --
-- --
-- THIS SOFTWARE IS PROVIDED BY THE COPYRIGHT HOLDERS AND CONTRIBUTORS --
-- "AS IS" AND ANY EXPRESS OR IMPLIED WARRANTIES, INCLUDING, BUT NOT --
-- LIMITED TO, THE IMPLIED WARRANTIES OF MERCHANTABILITY AND FITNESS FOR --
-- A PARTICULAR PURPOSE ARE DISCLAIMED. IN NO EVENT SHALL THE COPYRIGHT --
-- HOLDER OR CONTRIBUTORS BE LIABLE FOR ANY DIRECT, INDIRECT, INCIDENTAL, --
-- SPECIAL, EXEMPLARY, OR CONSEQUENTIAL DAMAGES (INCLUDING, BUT NOT LIMITED --
-- TO, PROCUREMENT OF SUBSTITUTE GOODS OR SERVICES; LOSS OF USE, DATA, OR --
-- PROFITS; OR BUSINESS INTERRUPTION) HOWEVER CAUSED AND ON ANY THEORY OF --
-- LIABILITY, WHETHER IN CONTRACT, STRICT LIABILITY, OR TORT (INCLUDING --
-- NEGLIGENCE OR OTHERWISE) ARISING IN ANY WAY OUT OF THE USE OF THIS --
-- SOFTWARE, EVEN IF ADVISED OF THE POSSIBILITY OF SUCH DAMAGE. --
-- --
------------------------------------------------------------------------------
-- $Revision$ $Date$
------------------------------------------------------------------------------
with ODF.DOM.Text_Title_Attributes;
package Matreshka.ODF_Text.Title_Attributes is
type Text_Title_Attribute_Node is
new Matreshka.ODF_Text.Abstract_Text_Attribute_Node
and ODF.DOM.Text_Title_Attributes.ODF_Text_Title_Attribute
with null record;
overriding function Create
(Parameters : not null access Matreshka.DOM_Attributes.Attribute_L2_Parameters)
return Text_Title_Attribute_Node;
overriding function Get_Local_Name
(Self : not null access constant Text_Title_Attribute_Node)
return League.Strings.Universal_String;
end Matreshka.ODF_Text.Title_Attributes;
|
AdaCore/gpr | Ada | 1,939 | adb | --
-- Copyright (C) 2019-2023, AdaCore
--
-- SPDX-License-Identifier: Apache-2.0
--
with Ada.Strings.Fixed;
with Ada.Text_IO;
with GPR2.Unit;
with GPR2.Context;
with GPR2.Path_Name;
with GPR2.Project.Source.Set;
with GPR2.Project.View;
with GPR2.Project.Tree;
with GPR2.Source_Info.Parser.Ada_Language;
procedure Main is
use Ada;
use GPR2;
use GPR2.Project;
procedure Check (Project_Name : Filename_Type);
-- Do check the given project's sources
procedure Output_Filename (Filename : Path_Name.Full_Name);
-- Remove the leading tmp directory
-----------
-- Check --
-----------
procedure Check (Project_Name : Filename_Type) is
Prj : Project.Tree.Object;
Ctx : Context.Object;
View : Project.View.Object;
begin
Project.Tree.Load (Prj, Create (Project_Name), Ctx);
View := Prj.Root_Project;
Text_IO.Put_Line ("Project: " & String (View.Name));
for Source of View.Sources loop
declare
U : constant Optional_Name_Type := Source.Unit_Name;
begin
Output_Filename (Source.Path_Name.Value);
Text_IO.Set_Col (20);
Text_IO.Put (" language: " & Image (Source.Language));
Text_IO.Set_Col (36);
Text_IO.Put (" Kind: "
& GPR2.Unit.Library_Unit_Type'Image (Source.Kind));
if U /= "" then
Text_IO.Set_Col (60);
Text_IO.Put ("unit: " & String (U));
end if;
Text_IO.New_Line;
end;
end loop;
end Check;
---------------------
-- Output_Filename --
---------------------
procedure Output_Filename (Filename : Path_Name.Full_Name) is
I : constant Positive := Strings.Fixed.Index (Filename, "source3");
begin
Text_IO.Put (" > " & Filename (I + 8 .. Filename'Last));
end Output_Filename;
begin
Check ("demo.gpr");
end Main;
|
lyarbean/xxhash-ada | Ada | 224 | ads | package xxhash is
pragma elaborate_body;
type byte is mod 2 ** 8;
type bytes is array (positive range <>) of byte;
type word is mod 2 ** 32;
function xxh32 (data : bytes; seed : word) return word;
end xxhash;
|
reznikmm/matreshka | Ada | 4,289 | 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.Style.Country_Asian.Internals is
------------
-- Create --
------------
function Create
(Node : Matreshka.ODF_Attributes.Style.Country_Asian.Style_Country_Asian_Access)
return ODF.DOM.Attributes.Style.Country_Asian.ODF_Style_Country_Asian 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.Style.Country_Asian.Style_Country_Asian_Access)
return ODF.DOM.Attributes.Style.Country_Asian.ODF_Style_Country_Asian is
begin
return
(XML.DOM.Attributes.Internals.Wrap
(Matreshka.DOM_Nodes.Attribute_Access (Node)) with null record);
end Wrap;
end ODF.DOM.Attributes.Style.Country_Asian.Internals;
|
onox/orka | Ada | 2,719 | 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 Interfaces.C.Strings;
with System;
with Ada.Characters.Latin_1;
package body Orka.OS is
procedure Set_Task_Name (Name : in String) is null;
----------------------------------------------------------------------------
type Clock_Kind is (Realtime, Monotonic);
for Clock_Kind use
(Realtime => 0,
Monotonic => 1);
for Clock_Kind'Size use Interfaces.C.int'Size;
type Timespec is record
Seconds : aliased Interfaces.C.long;
Nanoseconds : aliased Interfaces.C.long;
end record
with Convention => C;
function C_Clock_Gettime
(Kind : Clock_Kind;
Time : access Timespec) return Interfaces.C.int
with Import, Convention => C, External_Name => "clock_gettime";
function Monotonic_Clock return Duration is
Value : aliased Timespec;
Unused_Result : Interfaces.C.int;
begin
Unused_Result := C_Clock_Gettime (Monotonic, Value'Access);
return Duration (Value.Seconds) + Duration (Value.Nanoseconds) / 1e9;
end Monotonic_Clock;
function Monotonic_Clock return Time is (Time (Duration'(Monotonic_Clock)));
----------------------------------------------------------------------------
subtype Size_Type is Interfaces.C.unsigned_long;
procedure C_Fwrite
(Value : String;
Size : Size_Type;
Count : Size_Type;
File : System.Address)
with Import, Convention => C, External_Name => "fwrite";
File_Standard_Output : constant System.Address
with Import, Convention => C, External_Name => "stdout";
File_Standard_Error : constant System.Address
with Import, Convention => C, External_Name => "stderr";
procedure Put_Line (Value : String; Kind : File_Kind := Standard_Output) is
package L1 renames Ada.Characters.Latin_1;
C_Value : constant String := Value & L1.LF;
begin
C_Fwrite (C_Value, 1, C_Value'Length,
(case Kind is
when Standard_Output => File_Standard_Output,
when Standard_Error => File_Standard_Error));
end Put_Line;
end Orka.OS;
|
MinimSecure/unum-sdk | Ada | 2,107 | adb | -- Copyright 2009-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
task type Caller is
entry Initialize;
entry Call_Break_Me;
entry Finalize;
end Caller;
type Caller_Ptr is access Caller;
procedure Break_Me is
begin
null;
end Break_Me;
task body Caller is
begin
accept Initialize do
null;
end Initialize;
accept Call_Break_Me do
Break_Me;
end Call_Break_Me;
accept Finalize do
null;
end Finalize;
end Caller;
Task_List : array (1 .. 3) of Caller_Ptr;
begin
-- Start all our tasks, and call the "Initialize" entry to make
-- sure all of them have now been started. We call that entry
-- immediately after having created the task in order to make sure
-- that we wait for that task to be created before we try to create
-- another one. That way, we know that the order in our Task_List
-- corresponds to the order in the GNAT runtime.
for J in Task_List'Range loop
Task_List (J) := new Caller;
Task_List (J).Initialize;
end loop;
-- Next, call their Call_Break_Me entry of each task, using the same
-- order as the order used to create them.
for J in Task_List'Range loop -- STOP_HERE
Task_List (J).Call_Break_Me;
end loop;
-- And finally, let all the tasks die...
for J in Task_List'Range loop
Task_List (J).Finalize;
end loop;
end Foo;
|
Fabien-Chouteau/GESTE | Ada | 4,289 | ads | with GESTE;
with GESTE.Grid;
pragma Style_Checks (Off);
package Game_Assets.Level_1 is
-- Level_1
Width : constant := 20;
Height : constant := 15;
Tile_Width : constant := 16;
Tile_Height : constant := 16;
-- Back
package Back is
Width : constant := 20;
Height : constant := 20;
Data : aliased GESTE.Grid.Grid_Data :=
(( 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0),
( 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0),
( 0, 0, 83, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0),
( 0, 0, 84, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0),
( 0, 0, 85, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0),
( 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0),
( 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0),
( 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0),
( 0, 0, 0, 0, 0, 0, 0, 0, 0, 86, 86, 86, 0, 0, 0),
( 0, 0, 0, 0, 0, 0, 0, 0, 0, 86, 86, 86, 0, 0, 0),
( 0, 0, 0, 0, 0, 0, 0, 0, 0, 86, 86, 86, 0, 0, 0),
( 0, 0, 0, 0, 0, 0, 0, 0, 0, 86, 86, 86, 0, 0, 0),
( 0, 0, 0, 0, 0, 0, 0, 0, 0, 86, 86, 86, 0, 0, 0),
( 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0),
( 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0),
( 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 87, 88),
( 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0),
( 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0),
( 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0),
( 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 87, 88)) ;
end Back;
-- Mid
package Mid is
Width : constant := 20;
Height : constant := 20;
Data : aliased GESTE.Grid.Grid_Data :=
(( 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 89, 90),
( 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 89, 90),
( 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 89, 90),
( 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 91, 90, 90),
( 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 91, 90, 90, 90),
( 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 91, 90, 90, 90, 90),
( 0, 0, 0, 0, 0, 0, 0, 0, 0, 91, 90, 90, 90, 90, 90),
( 0, 0, 0, 0, 0, 0, 0, 0, 0, 89, 90, 90, 90, 90, 90),
( 0, 0, 0, 0, 0, 0, 0, 0, 0, 92, 93, 93, 90, 90, 90),
( 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 94, 90, 90, 90),
( 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 95, 90, 90, 90),
( 0, 0, 0, 0, 0, 96, 0, 0, 0, 0, 0, 97, 90, 90, 90),
( 0, 0, 0, 0, 0, 98, 0, 0, 0, 91, 99, 99, 90, 90, 90),
( 0, 0, 0, 0, 0, 100, 0, 0, 0, 89, 90, 90, 90, 90, 90),
( 0, 0, 0, 0, 0, 0, 96, 0, 0, 89, 90, 90, 90, 90, 90),
( 0, 0, 0, 0, 0, 0, 100, 0, 0, 92, 93, 93, 93, 93, 93),
( 0, 0, 0, 0, 0, 0, 0, 0, 0, 101, 0, 0, 0, 102, 88),
( 0, 0, 0, 0, 0, 0, 0, 0, 0, 101, 0, 0, 0, 103, 88),
( 0, 0, 0, 0, 0, 0, 0, 0, 0, 101, 0, 0, 0, 104, 88),
( 0, 0, 0, 0, 0, 0, 0, 0, 0, 91, 99, 99, 99, 99, 99)) ;
end Mid;
-- Front
package Front is
Width : constant := 20;
Height : constant := 20;
Data : aliased GESTE.Grid.Grid_Data :=
(( 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0),
( 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 105, 0, 0),
( 0, 0, 83, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0),
( 0, 0, 84, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0),
( 0, 0, 85, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0),
( 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0),
( 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0),
( 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0),
( 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0),
( 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0),
( 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0),
( 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0),
( 0, 0, 0, 0, 0, 0, 0, 0, 106, 0, 0, 0, 0, 0, 0),
( 0, 0, 0, 0, 0, 0, 0, 0, 107, 0, 0, 0, 0, 0, 0),
( 0, 0, 0, 0, 0, 0, 0, 0, 108, 0, 0, 0, 0, 0, 0),
( 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0),
( 0, 0, 0, 109, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0),
( 0, 0, 0, 110, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0),
( 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0),
( 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0)) ;
end Front;
end Game_Assets.Level_1;
|
onox/sdlada | Ada | 6,061 | ads | --------------------------------------------------------------------------------------------------------------------
-- Copyright (c) 2013-2018 Luke A. Guest
--
-- This software is provided 'as-is', without any express or implied
-- warranty. In no event will the authors be held liable for any damages
-- arising from the use of this software.
--
-- Permission is granted to anyone to use this software for any purpose,
-- including commercial applications, and to alter it and redistribute it
-- freely, subject to the following restrictions:
--
-- 1. The origin of this software must not be misrepresented; you must not
-- claim that you wrote the original software. If you use this software
-- in a product, an acknowledgment in the product documentation would be
-- appreciated but is not required.
--
-- 2. Altered source versions must be plainly marked as such, and must not be
-- misrepresented as being the original software.
--
-- 3. This notice may not be removed or altered from any source
-- distribution.
--------------------------------------------------------------------------------------------------------------------
-- SDL.Events
--
-- Mapping to the underlying event handling system.
--
-- WARNING!!!!
-- I wanted to experiment with the event system and possibly hide all this and create an abstraction in another
-- task so as to separate out the events from the main window. This could change. I really don't know yet.
--------------------------------------------------------------------------------------------------------------------
with Ada.Characters.Latin_1;
with Ada.Unchecked_Conversion;
with Interfaces;
with SDL.Video.Windows;
package SDL.Events is
type Event_Types is mod 2 ** 32 with
Convention => C;
type Button_State is (Released, Pressed) with
Convention => C;
for Button_State use (Released => 0, Pressed => 1);
-----------------------------------------------------------------------------------------------------------------
-- Event types.
-----------------------------------------------------------------------------------------------------------------
-- Handled via 'First attribute.
First_Event : constant Event_Types := 16#0000_0000#;
-- Application events.
Quit : constant Event_Types := 16#0000_0100#;
-- Mobile events.
App_Terminating : constant Event_Types := Quit + 1;
App_Low_Memory : constant Event_Types := Quit + 2;
App_Will_Enter_Background : constant Event_Types := Quit + 3;
App_Did_Enter_Background : constant Event_Types := Quit + 4;
App_Will_Enter_Foreground : constant Event_Types := Quit + 5;
App_Did_Enter_Foreground : constant Event_Types := Quit + 6;
-- Clipboard events.
Clipboard_Update : constant Event_Types := 16#0000_0900#;
-- TODO: Audio hot plug events for 2.0.4
-- User events.
User : constant Event_Types := 16#0000_8000#;
Last_Event : constant Event_Types := 16#0000_FFFF#;
type Padding_8 is mod 2 ** 8 with
Convention => C,
Size => 8;
type Padding_16 is mod 2 ** 16 with
Convention => C,
Size => 16;
type Time_Stamps is mod 2 ** 32 with
Convention => C;
type Common_Events is
record
Event_Type : Event_Types;
Time_Stamp : Time_Stamps;
end record with
Convention => C;
-----------------------------------------------------------------------------------------------------------------
-- TODO: Touch finger events
-----------------------------------------------------------------------------------------------------------------
-----------------------------------------------------------------------------------------------------------------
-- TODO: Multi gesture events
-----------------------------------------------------------------------------------------------------------------
-----------------------------------------------------------------------------------------------------------------
-- TODO: Dollar gesture events
-----------------------------------------------------------------------------------------------------------------
-----------------------------------------------------------------------------------------------------------------
-- TODO: Drop events
-----------------------------------------------------------------------------------------------------------------
-----------------------------------------------------------------------------------------------------------------
-- TODO: User events
-----------------------------------------------------------------------------------------------------------------
-----------------------------------------------------------------------------------------------------------------
-- TODO: System window manager events
-----------------------------------------------------------------------------------------------------------------
-----------------------------------------------------------------------------------------------------------------
-- TODO: Audio events - 2.0.4
-----------------------------------------------------------------------------------------------------------------
private
for Common_Events use
record
Event_Type at 0 * SDL.Word range 0 .. 31;
Time_Stamp at 1 * SDL.Word range 0 .. 31;
end record;
-- for Text_Editing_Events use
-- record
-- Event_Type at 0 * SDL.Word range 0 .. 31;
-- Time_Stamp at 1 * SDL.Word range 0 .. 31;
--
-- ID at 2 * SDL.Word range 0 .. 31;
-- State at 3 * SDL.Word range 0 .. 7;
-- Repeat at 3 * SDL.Word range 8 .. 15;
-- Padding_2 at 3 * SDL.Word range 16 .. 23;
-- Padding_3 at 3 * SDL.Word range 24 .. 31;
-- end record;
end SDL.Events;
|
msrLi/portingSources | Ada | 1,882 | adb | -- Copyright 2005-2014 Free Software Foundation, Inc.
--
-- This program is free software; you can redistribute it and/or modify
-- it under the terms of the GNU General Public License as published by
-- the Free Software Foundation; either version 3 of the License, or
-- (at your option) any later version.
--
-- This program is distributed in the hope that it will be useful,
-- but WITHOUT ANY WARRANTY; without even the implied warranty of
-- MERCHANTABILITY or FITNESS FOR A PARTICULAR PURPOSE. See the
-- GNU General Public License for more details.
--
-- You should have received a copy of the GNU General Public License
-- along with this program. If not, see <http://www.gnu.org/licenses/>.
procedure P is
type Index is (One, Two, Three);
type Table is array (Integer range 1 .. 3) of Integer;
type ETable is array (Index) of Integer;
type RTable is array (Index range Two .. Three) of Integer;
type UTable is array (Positive range <>) of Integer;
type PTable is array (Index) of Boolean;
pragma Pack (PTable);
function Get_UTable (I : Integer) return UTable is
begin
return Utable'(1 => I, 2 => 2, 3 => 3);
end Get_UTable;
One_Two_Three : Table := (1, 2, 3);
E_One_Two_Three : ETable := (1, 2, 3);
R_Two_Three : RTable := (2, 3);
U_One_Two_Three : UTable := Get_UTable (1);
P_One_Two_Three : PTable := (False, True, True);
Few_Reps : UTable := (1, 2, 3, 3, 3, 3, 3, 4, 5);
Many_Reps : UTable := (1, 2, 3, 3, 3, 3, 3, 3, 3, 3, 3, 3, 3, 3, 4, 5);
Empty : array (1 .. 0) of Integer := (others => 0);
begin
One_Two_Three (1) := 4; -- START
E_One_Two_Three (One) := 4;
R_Two_Three (Two) := 4;
U_One_Two_Three (U_One_Two_Three'First) := 4;
P_One_Two_Three (One) := True;
Few_Reps (Few_Reps'First) := 2;
Many_Reps (Many_Reps'First) := 2;
Empty := (others => 1);
end P;
|
charlie5/cBound | Ada | 1,534 | 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_free_colormap_request_t is
-- Item
--
type Item is record
major_opcode : aliased Interfaces.Unsigned_8;
pad0 : aliased Interfaces.Unsigned_8;
length : aliased Interfaces.Unsigned_16;
cmap : aliased xcb.xcb_colormap_t;
end record;
-- Item_Array
--
type Item_Array is
array
(Interfaces.C
.size_t range <>) of aliased xcb.xcb_free_colormap_request_t
.Item;
-- Pointer
--
package C_Pointers is new Interfaces.C.Pointers
(Index => Interfaces.C.size_t,
Element => xcb.xcb_free_colormap_request_t.Item,
Element_Array => xcb.xcb_free_colormap_request_t.Item_Array,
Default_Terminator => (others => <>));
subtype Pointer is C_Pointers.Pointer;
-- Pointer_Array
--
type Pointer_Array is
array
(Interfaces.C
.size_t range <>) of aliased xcb.xcb_free_colormap_request_t
.Pointer;
-- Pointer_Pointer
--
package C_Pointer_Pointers is new Interfaces.C.Pointers
(Index => Interfaces.C.size_t,
Element => xcb.xcb_free_colormap_request_t.Pointer,
Element_Array => xcb.xcb_free_colormap_request_t.Pointer_Array,
Default_Terminator => null);
subtype Pointer_Pointer is C_Pointer_Pointers.Pointer;
end xcb.xcb_free_colormap_request_t;
|
reznikmm/matreshka | Ada | 3,719 | ads | ------------------------------------------------------------------------------
-- --
-- Matreshka Project --
-- --
-- Open Document Toolkit --
-- --
-- Runtime Library Component --
-- --
------------------------------------------------------------------------------
-- --
-- Copyright © 2014, Vadim Godunko <[email protected]> --
-- All rights reserved. --
-- --
-- Redistribution and use in source and binary forms, with or without --
-- modification, are permitted provided that the following conditions --
-- are met: --
-- --
-- * Redistributions of source code must retain the above copyright --
-- notice, this list of conditions and the following disclaimer. --
-- --
-- * Redistributions in binary form must reproduce the above copyright --
-- notice, this list of conditions and the following disclaimer in the --
-- documentation and/or other materials provided with the distribution. --
-- --
-- * Neither the name of the Vadim Godunko, IE nor the names of its --
-- contributors may be used to endorse or promote products derived from --
-- this software without specific prior written permission. --
-- --
-- THIS SOFTWARE IS PROVIDED BY THE COPYRIGHT HOLDERS AND CONTRIBUTORS --
-- "AS IS" AND ANY EXPRESS OR IMPLIED WARRANTIES, INCLUDING, BUT NOT --
-- LIMITED TO, THE IMPLIED WARRANTIES OF MERCHANTABILITY AND FITNESS FOR --
-- A PARTICULAR PURPOSE ARE DISCLAIMED. IN NO EVENT SHALL THE COPYRIGHT --
-- HOLDER OR CONTRIBUTORS BE LIABLE FOR ANY DIRECT, INDIRECT, INCIDENTAL, --
-- SPECIAL, EXEMPLARY, OR CONSEQUENTIAL DAMAGES (INCLUDING, BUT NOT LIMITED --
-- TO, PROCUREMENT OF SUBSTITUTE GOODS OR SERVICES; LOSS OF USE, DATA, OR --
-- PROFITS; OR BUSINESS INTERRUPTION) HOWEVER CAUSED AND ON ANY THEORY OF --
-- LIABILITY, WHETHER IN CONTRACT, STRICT LIABILITY, OR TORT (INCLUDING --
-- NEGLIGENCE OR OTHERWISE) ARISING IN ANY WAY OUT OF THE USE OF THIS --
-- SOFTWARE, EVEN IF ADVISED OF THE POSSIBILITY OF SUCH DAMAGE. --
-- --
------------------------------------------------------------------------------
-- $Revision$ $Date$
------------------------------------------------------------------------------
with XML.DOM.Attributes;
package ODF.DOM.Style_Adjustment_Attributes is
pragma Preelaborate;
type ODF_Style_Adjustment_Attribute is limited interface
and XML.DOM.Attributes.DOM_Attribute;
type ODF_Style_Adjustment_Attribute_Access is
access all ODF_Style_Adjustment_Attribute'Class
with Storage_Size => 0;
end ODF.DOM.Style_Adjustment_Attributes;
|
reznikmm/matreshka | Ada | 4,043 | ads | ------------------------------------------------------------------------------
-- --
-- Matreshka Project --
-- --
-- Open Document Toolkit --
-- --
-- Runtime Library Component --
-- --
------------------------------------------------------------------------------
-- --
-- Copyright © 2014, Vadim Godunko <[email protected]> --
-- All rights reserved. --
-- --
-- Redistribution and use in source and binary forms, with or without --
-- modification, are permitted provided that the following conditions --
-- are met: --
-- --
-- * Redistributions of source code must retain the above copyright --
-- notice, this list of conditions and the following disclaimer. --
-- --
-- * Redistributions in binary form must reproduce the above copyright --
-- notice, this list of conditions and the following disclaimer in the --
-- documentation and/or other materials provided with the distribution. --
-- --
-- * Neither the name of the Vadim Godunko, IE nor the names of its --
-- contributors may be used to endorse or promote products derived from --
-- this software without specific prior written permission. --
-- --
-- THIS SOFTWARE IS PROVIDED BY THE COPYRIGHT HOLDERS AND CONTRIBUTORS --
-- "AS IS" AND ANY EXPRESS OR IMPLIED WARRANTIES, INCLUDING, BUT NOT --
-- LIMITED TO, THE IMPLIED WARRANTIES OF MERCHANTABILITY AND FITNESS FOR --
-- A PARTICULAR PURPOSE ARE DISCLAIMED. IN NO EVENT SHALL THE COPYRIGHT --
-- HOLDER OR CONTRIBUTORS BE LIABLE FOR ANY DIRECT, INDIRECT, INCIDENTAL, --
-- SPECIAL, EXEMPLARY, OR CONSEQUENTIAL DAMAGES (INCLUDING, BUT NOT LIMITED --
-- TO, PROCUREMENT OF SUBSTITUTE GOODS OR SERVICES; LOSS OF USE, DATA, OR --
-- PROFITS; OR BUSINESS INTERRUPTION) HOWEVER CAUSED AND ON ANY THEORY OF --
-- LIABILITY, WHETHER IN CONTRACT, STRICT LIABILITY, OR TORT (INCLUDING --
-- NEGLIGENCE OR OTHERWISE) ARISING IN ANY WAY OUT OF THE USE OF THIS --
-- SOFTWARE, EVEN IF ADVISED OF THE POSSIBILITY OF SUCH DAMAGE. --
-- --
------------------------------------------------------------------------------
-- $Revision$ $Date$
------------------------------------------------------------------------------
with ODF.DOM.Style_Flow_With_Text_Attributes;
package Matreshka.ODF_Style.Flow_With_Text_Attributes is
type Style_Flow_With_Text_Attribute_Node is
new Matreshka.ODF_Style.Abstract_Style_Attribute_Node
and ODF.DOM.Style_Flow_With_Text_Attributes.ODF_Style_Flow_With_Text_Attribute
with null record;
overriding function Create
(Parameters : not null access Matreshka.DOM_Attributes.Attribute_L2_Parameters)
return Style_Flow_With_Text_Attribute_Node;
overriding function Get_Local_Name
(Self : not null access constant Style_Flow_With_Text_Attribute_Node)
return League.Strings.Universal_String;
end Matreshka.ODF_Style.Flow_With_Text_Attributes;
|
Fabien-Chouteau/coffee-clock | Ada | 56,150 | ads | -- This file was generated by bmp2ada
with Giza.Image;
with Giza.Image.DMA2D;
use Giza.Image.DMA2D;
package digit_6 is
pragma Style_Checks (Off);
CLUT : aliased constant L4_CLUT_T := (
(R => 0, G => 0, B => 0),
(R => 255, G => 0, B => 0), others => (0, 0, 0));
Data : aliased constant L4_Data_T := (
0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0,
0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0,
0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0,
0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0,
0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0,
0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0,
0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0,
0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0,
0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 16, 17, 17, 17, 17, 17, 17, 17,
17, 17, 17, 1, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0,
0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 16, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0,
0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 17, 17, 17, 17,
17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0,
0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17,
17, 17, 17, 1, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0,
0, 0, 16, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 1, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0,
0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17,
17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 1, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0,
0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 0,
0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17,
17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 1, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0,
0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 16, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17,
17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 1, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 16, 17, 17, 17,
17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 1, 0, 0, 0, 0, 0, 0, 0, 0,
0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17,
17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 1, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0,
0, 0, 0, 0, 0, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17,
17, 1, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17,
17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 1, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0,
0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 16, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17,
17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 1, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 16, 17, 17, 17, 17, 17, 17, 17,
17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 1, 0, 0, 0, 0, 0, 0, 0, 0,
0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17,
17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 1, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0,
0, 16, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17,
17, 1, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 16, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17,
17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 1, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0,
0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17,
17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 1, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 16, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17,
17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 1, 0, 0, 0, 0, 0, 0, 0, 0,
0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17,
17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 1, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 16, 17,
17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17,
17, 1, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17,
17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 1, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0,
0, 0, 0, 0, 0, 0, 0, 16, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17,
17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 1, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17,
17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 1, 0, 0, 0, 0, 0, 0, 0, 0,
0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 16, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17,
17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 1, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 17, 17, 17, 17,
17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17,
17, 1, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 16, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17,
17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 1, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0,
0, 0, 0, 0, 0, 16, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17,
17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 1, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17,
17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 1, 0, 0, 0, 0, 0, 0, 0, 0,
0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 16, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17,
17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 1, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 17, 17, 17, 17, 17, 17,
17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 1, 0, 0, 0, 0, 0, 0, 0, 16, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17,
17, 1, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17,
17, 17, 17, 17, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 1, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0,
0, 0, 0, 16, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0,
17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 1, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17,
17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 1, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 17, 17, 17, 17, 17, 17, 17, 17, 17, 1, 0, 0, 0, 0, 0, 0, 0, 0,
0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 1, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0,
0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 16, 17, 17, 17, 17, 17, 17, 17, 1, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 16, 17, 17, 17, 17, 17, 17, 17,
17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 1, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 17, 17, 17, 17, 17,
17, 1, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 1, 0, 0,
0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 16, 17, 17, 17, 17, 1, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0,
0, 0, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0,
0, 0, 0, 0, 0, 0, 0, 16, 17, 17, 17, 1, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 16, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17,
17, 17, 17, 17, 17, 17, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 17, 17, 1, 0, 0, 0, 0, 0, 0, 0, 0,
0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 16, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 1, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0,
0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 17, 1, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 17, 17, 17, 17, 17, 17, 17, 17, 17,
17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0,
0, 1, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 1, 0, 0, 0, 0, 0,
0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0,
16, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0,
0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 16, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17,
17, 17, 17, 1, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0,
0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0,
0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17,
17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 1, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0,
0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 16, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 1, 0, 0, 0, 0, 0, 0, 0,
0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 16,
17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0,
0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17,
17, 1, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0,
0, 0, 0, 0, 0, 0, 0, 0, 0, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 1, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0,
0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17,
17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0,
0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 16, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 0, 0, 0, 0, 0, 0, 0, 0, 0,
0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 16, 17,
17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 1, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0,
0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17,
1, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0,
0, 0, 0, 0, 0, 0, 0, 0, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0,
0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17,
17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0,
0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 16, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 1, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0,
0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 16, 17, 17,
17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 1, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0,
0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 16, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 1,
0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0,
0, 0, 0, 0, 0, 0, 0, 16, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0,
0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17,
17, 17, 17, 17, 17, 17, 17, 17, 17, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0,
0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0,
0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 17, 17, 17,
17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 1, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0,
0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 1, 0,
0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0,
0, 0, 0, 0, 0, 0, 16, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 1, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0,
0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 16, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17,
17, 17, 17, 17, 17, 17, 17, 17, 1, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 16, 17, 17, 17, 17, 17, 17, 17, 17, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0,
0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 16, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 17,
17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 1, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 16, 17, 17, 17,
17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 0, 0, 0, 0, 0, 0, 0, 0, 0, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 1, 0, 0, 0,
0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 0, 0,
0, 0, 0, 0, 0, 16, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0,
0, 0, 0, 0, 0, 0, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 0, 0, 0, 0, 0, 0, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17,
17, 17, 17, 17, 17, 17, 17, 17, 17, 1, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17,
17, 17, 17, 17, 17, 17, 17, 17, 0, 0, 0, 0, 0, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 0, 0, 0, 0, 0, 0, 0, 0, 0,
0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 0, 0, 0, 0, 17, 17, 17, 17, 17, 17, 17, 17,
17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 17, 17, 17, 17,
17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 1, 0, 0, 0, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17,
17, 17, 17, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 1, 0, 0,
17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 1, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0,
0, 0, 0, 0, 0, 16, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 1, 0, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17,
17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 1, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 16, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17,
17, 17, 17, 17, 17, 17, 17, 1, 16, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 1, 0, 0, 0, 0,
0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 16, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17,
17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 16, 17, 17, 17, 17,
17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17,
17, 17, 17, 17, 17, 17, 1, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 16, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17,
17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 1, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0,
0, 0, 0, 0, 0, 16, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17,
17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 16, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17,
17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 1, 0,
0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 16, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17,
17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 16, 17, 17, 17, 17,
17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17,
17, 17, 17, 17, 17, 17, 17, 17, 17, 1, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 16, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17,
17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0,
0, 0, 0, 0, 0, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17,
17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 1, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17,
17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17,
17, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17,
17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 1, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 17, 17, 17, 17, 17,
17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17,
17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 1, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17,
17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 0, 0, 0, 0, 0, 0, 0, 0,
0, 0, 0, 0, 0, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17,
17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 1, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17,
17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17,
17, 17, 17, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17,
17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 17, 17, 17, 17, 17,
17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17,
17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 1, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17,
17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 1, 0, 0, 0, 0, 0, 0,
0, 0, 0, 0, 0, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17,
17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17,
17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 0, 0, 0, 0, 0, 16, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17,
17, 17, 17, 17, 1, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 0, 0,
0, 0, 0, 0, 0, 0, 0, 16, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 1, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 17, 17, 17, 17, 17,
17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 16, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17,
17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 1, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17,
17, 17, 17, 17, 17, 17, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 16, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 0, 0, 0, 0, 0,
0, 0, 0, 0, 0, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 1, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0,
17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17,
17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 1, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17,
17, 17, 17, 17, 17, 1, 0, 0, 0, 0, 0, 0, 0, 0, 0, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 0, 0, 0, 0, 0, 0,
0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 16, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 1, 0, 0, 0, 0, 0, 0, 0, 0, 0, 17, 17, 17, 17, 17,
17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 16, 17, 17, 17, 17, 17, 17, 17, 17,
17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 0, 0, 0, 0, 0, 0, 0, 0, 0, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17,
17, 17, 17, 1, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 0, 0, 0, 0,
0, 0, 0, 0, 0, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0,
0, 0, 16, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 0, 0, 0, 0, 0, 0, 0, 0, 0, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17,
17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 1, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17,
17, 17, 17, 17, 17, 17, 0, 0, 0, 0, 0, 0, 0, 0, 0, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 1, 0, 0, 0, 0, 0, 0, 0,
0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 1, 0, 0, 0, 0, 0, 0, 0, 0, 17, 17, 17, 17, 17,
17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 16, 17, 17, 17, 17, 17, 17,
17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 1, 0, 0, 0, 0, 0, 0, 0, 0, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17,
17, 17, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 16, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 1, 0, 0, 0,
0, 0, 0, 0, 0, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0,
0, 0, 0, 16, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 1, 0, 0, 0, 0, 0, 0, 0, 0, 16, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17,
17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 1, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17,
17, 17, 17, 17, 17, 17, 17, 0, 0, 0, 0, 0, 0, 0, 0, 16, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 1, 0, 0, 0, 0, 0, 0, 0, 0,
0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 0, 0, 0, 0, 0, 0, 0, 0, 16, 17, 17, 17, 17,
17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 1, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 17, 17, 17, 17, 17, 17,
17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 0, 0, 0, 0, 0, 0, 0, 0, 16, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17,
17, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 16, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 0, 0, 0,
0, 0, 0, 0, 0, 16, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0,
0, 0, 0, 0, 16, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 0, 0, 0, 0, 0, 0, 0, 0, 16, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17,
17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 16, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17,
17, 17, 17, 17, 17, 17, 17, 0, 0, 0, 0, 0, 0, 0, 0, 16, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 0, 0, 0, 0, 0, 0, 0, 0, 0,
0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 16, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 1, 0, 0, 0, 0, 0, 0, 0, 16, 17, 17, 17, 17,
17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 16, 17, 17, 17, 17, 17,
17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 1, 0, 0, 0, 0, 0, 0, 0, 16, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17,
17, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 16, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 1, 0, 0,
0, 0, 0, 0, 0, 0, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 1, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0,
0, 0, 0, 0, 0, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 1, 0, 0, 0, 0, 0, 0, 0, 0, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17,
17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 1, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17,
17, 17, 17, 17, 17, 17, 17, 1, 0, 0, 0, 0, 0, 0, 0, 0, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 1, 0, 0, 0, 0, 0, 0, 0, 0, 0,
0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 1, 0, 0, 0, 0, 0, 0, 0, 0, 17, 17, 17, 17,
17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 1, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 17, 17, 17, 17, 17,
17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 1, 0, 0, 0, 0, 0, 0, 0, 0, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17,
1, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 1, 0, 0,
0, 0, 0, 0, 0, 0, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 1, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0,
0, 0, 0, 0, 0, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 1, 0, 0, 0, 0, 0, 0, 0, 0, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17,
17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 1, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17,
17, 17, 17, 17, 17, 17, 17, 1, 0, 0, 0, 0, 0, 0, 0, 0, 16, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 1, 0, 0, 0, 0, 0, 0, 0, 0, 0,
0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 1, 0, 0, 0, 0, 0, 0, 0, 0, 16, 17, 17, 17,
17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 1, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 17, 17, 17, 17, 17,
17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 1, 0, 0, 0, 0, 0, 0, 0, 0, 16, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17,
1, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 1, 0, 0,
0, 0, 0, 0, 0, 0, 16, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 1, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0,
0, 0, 0, 0, 0, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 1, 0, 0, 0, 0, 0, 0, 0, 0, 0, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17,
17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 1, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17,
17, 17, 17, 17, 17, 17, 17, 1, 0, 0, 0, 0, 0, 0, 0, 0, 0, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 1, 0, 0, 0, 0, 0, 0, 0, 0, 0,
0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 1, 0, 0, 0, 0, 0, 0, 0, 0, 0, 17, 17, 17,
17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 1, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 17, 17, 17, 17, 17,
17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 1, 0, 0, 0, 0, 0, 0, 0, 0, 0, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17,
1, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 0, 0, 0,
0, 0, 0, 0, 0, 0, 0, 16, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 1, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0,
0, 0, 0, 0, 0, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 16, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17,
17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 16, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17,
17, 17, 17, 17, 17, 17, 17, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 16, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 0, 0, 0, 0, 0, 0, 0, 0, 0,
0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 16, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 16, 17, 17,
17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 16, 17, 17, 17, 17, 17,
17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17,
17, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 16, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 0, 0, 0,
0, 0, 0, 0, 0, 0, 0, 0, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0,
0, 0, 0, 0, 16, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17,
17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 16, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17,
17, 17, 17, 17, 17, 17, 1, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 16, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 1, 0, 0, 0, 0, 0, 0, 0, 0,
0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 1, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 16, 17,
17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 1, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 17, 17, 17, 17, 17, 17,
17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 1, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 16, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17,
17, 1, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 1, 0, 0, 0,
0, 0, 0, 0, 0, 0, 0, 0, 0, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0,
0, 0, 0, 16, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17,
17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 16, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17,
17, 17, 17, 17, 17, 17, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 16, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 0, 0, 0, 0, 0, 0, 0, 0,
0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 16, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 16,
17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 1, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 17, 17, 17, 17, 17, 17, 17,
17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 1, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17,
17, 17, 1, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 1, 0, 0, 0, 0,
0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0,
0, 0, 16, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 1, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17,
17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 1, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17,
17, 17, 17, 17, 17, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 16, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 0, 0, 0, 0, 0, 0,
0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 16, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0,
16, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 16, 17, 17, 17, 17, 17, 17, 17, 17,
17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 1, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17,
17, 17, 17, 17, 1, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 1, 0, 0, 0, 0, 0,
0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 16, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 1, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0,
17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 16, 17, 17, 17, 17, 17, 17, 17, 17,
17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 16, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17,
17, 17, 17, 17, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 0, 0, 0,
0, 0, 0, 0, 0, 0, 0, 0, 16, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 1, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0,
0, 0, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 0, 0, 0, 0, 0, 0, 0, 0, 0, 16, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17,
17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 1, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 16, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17,
17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 0, 0, 0, 0, 0, 16, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 0, 0, 0, 0, 0, 0, 0,
0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17,
17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 17, 17, 17, 17, 17, 17, 17,
17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17,
17, 17, 1, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 16, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17,
17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0,
0, 0, 0, 0, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17,
17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17,
17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 1, 0, 0, 0, 0, 0, 0, 0, 0,
0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 16, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17,
17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 17, 17, 17, 17, 17,
17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17,
1, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 16, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17,
17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 1, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0,
0, 0, 0, 0, 0, 0, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17,
17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 16, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17,
17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 1, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0,
0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17,
17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 16, 17, 17,
17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 1, 0,
0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17,
17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0,
0, 0, 0, 0, 0, 0, 0, 0, 16, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17,
17, 17, 17, 17, 17, 17, 17, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17,
17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 1, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0,
0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 16, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17,
17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0,
17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 1, 0, 0, 0, 0,
0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17,
17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 1, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0,
0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 16, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17,
17, 17, 17, 17, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 16, 17, 17, 17, 17, 17, 17, 17,
17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0,
0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17,
17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 1, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0,
0, 0, 0, 0, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 1, 0, 0, 0, 0, 0, 0, 0, 0,
0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17,
17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 1, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0,
0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 1,
0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 17, 17, 17,
17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0,
0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 16, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17,
17, 17, 17, 17, 17, 17, 17, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0,
0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 1, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0,
0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 16, 17, 17, 17, 17, 17, 17, 17, 17,
17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 1, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0,
0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 17, 0, 0, 0, 0, 0, 0, 0, 0, 0,
0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0,
0, 0, 0, 0, 0, 0, 0, 16, 17, 17, 17, 17, 17, 17, 17, 17, 17, 1, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0
);
Image : constant Giza.Image.Ref := new Giza.Image.DMA2D.Instance'
(Mode => L4, W => 160, H => 195, Length => 15600, L4_CLUT => CLUT'Access, L4_Data => Data'Access);
pragma Style_Checks (On);
end digit_6;
|
afrl-rq/OpenUxAS | Ada | 1,554 | ads | -- linear/geographical conversions
generic
type Real is digits <>;
package Unit_Conversion_Utilities is
type Unit_Converter is tagged private;
procedure Initialize
(This : out Unit_Converter;
LatitudeInit_Rad : Real;
LongitudeInit_rad : Real);
-- FROM LAT/LONG TO NORTH/EAST
procedure Convert_LatLong_Degrees_To_NorthEast_Meters
(This : in out Unit_Converter;
Latitude_Deg : Real;
Longitude_Deg : Real;
North : out Real;
East : out Real);
-- FROM NORTH/EAST TO LAT/LONG
-- ...
-- const double m_dRadiusEquatorial_m{6378135.0};
dRadiusEquatorial_m : constant := 6_378_135.0;
-- const double m_dFlattening{3.352810664724998e-003};
dFlattening : constant := 3.352810664724998e-003;
-- const double m_dEccentricitySquared{6.694379990096503e-003};
dEccentricitySquared : constant := 6.694379990096503e-003;
private
type Unit_Converter is tagged record
-- static double m_dLatitudeInitial_rad;
m_dLatitudeInitial_rad : Real;
-- static double m_dLongitudeInitial_rad;
m_dLongitudeInitial_rad : Real;
-- static double m_dRadiusMeridional_m;
m_dRadiusMeridional_m : Real;
-- static double m_dRadiusTransverse_m;
m_dRadiusTransverse_m : Real;
-- static double m_dRadiusSmallCircleLatitude_m;
m_dRadiusSmallCircleLatitude_m : Real;
-- Static Bool M_BInitialized;
Initialized : Boolean := False;
end record;
end Unit_Conversion_Utilities;
|
reznikmm/matreshka | Ada | 28 | ads |
package Demo is
end Demo;
|
BrickBot/Bound-T-H8-300 | Ada | 10,420 | adb | -- Storage.Bounds.Disjoint_Intervals (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.5 $
-- $Date: 2015/10/24 20:05:51 $
--
-- $Log: storage-bounds-disjoint_intervals.adb,v $
-- Revision 1.5 2015/10/24 20:05:51 niklas
-- Moved to free licence.
--
-- Revision 1.4 2015/04/18 10:26:03 niklas
-- Added the Is_Void predicate on Bounds_T.
--
-- Revision 1.3 2013/12/20 21:05:00 niklas
-- Made function Values (Sequence_T) return Value_List_T obey the
-- option Max_Listed_Values from Storage.Bounds.Opt.
--
-- Revision 1.2 2013/12/08 20:16:29 niklas
-- Added subtype Sequence_T, renaming Interval_List_T with a specific
-- meaning. Added operations on Sequence_T.
-- Added type Bounds_T, bounds on a cell based on a Sequence_T, with
-- several overridings of primitive operations on bounds.
--
-- Revision 1.1 2013-02-03 12:35:03 niklas
-- First version.
--
with Ada.Text_IO;
with Arithmetic;
with Storage.Bounds.Opt;
package body Storage.Bounds.Disjoint_Intervals is
use type Arithmetic.Value_T;
--
--- Lists of disjoint intervals in increasing order
--
function Bounding_Interval (Sequence : Sequence_T) return Interval_T
is
begin
if Sequence'Last = 0 then
return Void_Interval;
else
return Interval_T'(
Min => Sequence(Sequence'First).Min,
Max => Sequence(Sequence'Last ).Max);
end if;
end Bounding_Interval;
function Bounded (Sequence : Sequence_T) return Boolean
is
begin
return Bounded (Bounding_Interval (Sequence));
end Bounded;
function Number_Of_Values (Sequence : Sequence_T) return Arithmetic.Value_T
is
use type Arithmetic.Value_T;
Number : Arithmetic.Value_T := 0;
-- The count so far.
begin
if not Bounded (Sequence) then
raise Unbounded;
else
for I in 1 .. Sequence'Last loop
Number := Number + Number_Of_Values (Sequence(I));
end loop;
end if;
return Number;
end Number_Of_Values;
Abs_Max_Listed_Values : constant Positive := 5_000;
--
-- The fixed absolute upper bound on the number of values
-- that can be listed by Values (List_T).
function Values (Sequence : Sequence_T) return Value_List_T
is
Num : constant Arithmetic.Value_T := Number_Of_Values (Sequence);
-- The total number of values in the set defined by the Sequence.
-- If the set is unbounded, this raises Unbounded.
Allowed_Num : constant Natural :=
Natural'Min (Opt.Max_Listed_Values, Abs_Max_Listed_Values);
-- An upper bound on the allowed number of listed values.
Vals : Value_List_T (1 .. Abs_Max_Listed_Values);
Last : Natural := 0;
-- The values in the List, as Vals(1 .. Last).
begin
if Num > Arithmetic.Value_T (Allowed_Num) then
-- The Sequence contains more values than we are
-- allowed to enumerate in a list.
raise Unbounded;
else
for I in 1 .. Sequence'Last loop
for V in Sequence(I).Min.Value
.. Sequence(I).Max.Value
loop
Last := Last + 1;
Vals(Last) := V;
end loop;
end loop;
return Vals(1 .. Last);
end if;
end Values;
--
--- Lists of disjoint intervals of dynamic but bounded length
--
function Precedes (A, B : Interval_T) return Boolean
--
-- Whether the interval A entirely precedes B, with a
-- gap in between.
--
-- Precondition: both intervals are non-void.
--
is
begin
return (Known (A.Max) and Known (B.Min))
and then Max (A) + 1 < Min (B);
end Precedes;
function Touches (A, B : Interval_T) return Boolean
--
-- Whether the two intervals "touch" in the sense that they
-- intersect or are contiguous.
--
-- Precondition: both intervals are non-void.
--
is
begin
return not (Precedes (A, B) or else Precedes (B, A));
end Touches;
procedure Merge (
A, B : in List_T;
To : out List_T)
is
Ax : Positive := 1;
Bx : Positive := 1;
-- Indices of the next elements from the A and B lists.
Union : Interval_T;
-- A merged element under construction.
Num : Natural := 0;
-- The total number of intervals in the merged list (even
-- if larger than its capacity).
begin
Num := 0;
-- Compare and merge:
while Ax <= A.Last
and Bx <= B.Last
loop
-- Initialize a new element for the merged list:
if Precedes (A.Intervals(Ax), B.Intervals(Bx)) then
Union := A.Intervals(Ax);
Ax := Ax + 1;
elsif Precedes (B.Intervals(Bx), A.Intervals(Ax)) then
Union := B.Intervals(Bx);
Bx := Bx + 1;
else
Union := A.Intervals(Ax) or B.Intervals(Bx);
Ax := Ax + 1;
Bx := Bx + 1;
end if;
-- Grow the new element for as long as either input
-- list provides a contiguous or intersecting element:
loop
if Ax <= A.Last
and then Touches (Union, A.Intervals(Ax)) then
Union := Union or A.Intervals(Ax);
Ax := Ax + 1;
elsif Bx <= B.Last
and then Touches (Union, B.Intervals(Bx)) then
Union := Union or B.Intervals(Bx);
Bx := Bx + 1;
else
exit;
end if;
end loop;
-- Put the new element in the merged list:
Num := Num + 1;
if Num <= To.Max_Num_Intervals then
To.Intervals(Num) := Union;
end if;
end loop;
-- Now one of the input lists is exhausted, so we finish
-- by copying the rest of the other list to the merged list:
while Ax <= A.Last loop
Num := Num + 1;
if Num <= To.Max_Num_Intervals then
To.Intervals(Num) := A.Intervals(Ax);
end if;
Ax := Ax + 1;
end loop;
while Bx <= B.Last loop
Num := Num + 1;
if Num <= To.Max_Num_Intervals then
To.Intervals(Num) := B.Intervals(Bx);
end if;
Bx := Bx + 1;
end loop;
-- Report possible overflow:
if Num > To.Max_Num_Intervals then
Ada.Text_IO.Put_Line (
"Merge overflow: merging lost"
& Positive'Image (Num - To.Max_Num_Intervals)
& " intervals.");
Num := To.Max_Num_Intervals;
if Num in To.Intervals'Range then
To.Intervals(Num).Max := Not_Limited;
end if;
end if;
To.Last := Num;
end Merge;
procedure Add (
Interval : in Interval_T;
To : in out List_T)
is
Addend : List_T := (
Max_Num_Intervals => 1,
Last => 1,
Intervals => (1 => Interval));
Sum : List_T (Max_Num_Intervals => To.Max_Num_Intervals);
begin
Merge (A => To, B => Addend, To => Sum);
To := Sum;
end Add;
function To_Intervals (List : List_T)
return Interval_List_T
is
begin
return List.Intervals(1 .. List.Last);
end To_Intervals;
--
--- Bounds on one cell, defined by a fixed list of disjoint intervals
--
overriding
function Basis (Item : Bounds_T) return Cell_List_T
is
begin
return (1 => Item.Cell);
end Basis;
not overriding -- but will later be
function Is_Void (Item : Bounds_T) return Boolean
is
begin
return Item.Num_Intervals = 0;
end Is_Void;
overriding
function Interval (Cell : Cell_T; Under : Bounds_T)
return Interval_T
is
begin
if Cell = Under.Cell then
return Bounding_Interval (Under.Values);
else
return Universal_Interval;
end if;
end Interval;
overriding
function Values (Cell : Cell_T; Under : Bounds_T)
return Value_List_T
is
begin
if Cell = Under.Cell then
return Values (Under.Values);
else
raise Unbounded;
end if;
end Values;
overriding
function Image (Item : Bounds_T) return String
is
begin
return "Disjoint-Interval-List"
& '['
& Image (Item.Cell)
& ']';
end Image;
overriding
function Full_Image (Item : Bounds_T) return String
is
begin
return Image (Item.Values, Storage.Image (Item.Cell));
end Full_Image;
end Storage.Bounds.Disjoint_Intervals;
|
AdaCore/ada-traits-containers | Ada | 11,670 | ads | --
-- Copyright (C) 2015-2016, AdaCore
--
-- SPDX-License-Identifier: Apache-2.0 WITH LLVM-exception
--
-- A vector abstract data type
pragma Ada_2012;
with Conts.Cursors;
with Conts.Properties;
with Conts.Vectors.Storage;
with Conts.Vectors.Impl;
generic
type Index_Type is (<>);
-- Because Last needs to return a meaningful value for empty vectors,
-- (Index_Type'First - 1) must be a valid value in Index_Type'Base.
-- This means that the index type cannot be Integer.
-- Nor can it be an enumeration type. However, this would not be a good
-- use case for vectors anyway, since the number of elements is known at
-- compile time and a standard Ada array would be more efficient.
with package Storage is new Conts.Vectors.Storage.Traits (<>);
package Conts.Vectors.Generics with SPARK_Mode is
pragma Assertion_Policy
(Pre => Suppressible, Ghost => Suppressible, Post => Ignore);
subtype Element_Type is Storage.Elements.Element_Type;
subtype Returned_Type is Storage.Elements.Returned_Type;
subtype Constant_Returned_Type is Storage.Elements.Constant_Returned_Type;
subtype Stored_Type is Storage.Elements.Stored_Type;
package Impl is new Conts.Vectors.Impl (Index_Type, Storage);
subtype Extended_Index is Impl.Extended_Index;
subtype Base_Vector is Impl.Base_Vector;
subtype Cursor is Impl.Cursor;
No_Element : constant Cursor := Impl.No_Element;
No_Index : constant Extended_Index := Impl.No_Index;
function To_Count (Idx : Index_Type) return Count_Type
renames Impl.To_Count;
-- Converts to or from an index type to an index into the actual underlying
-- array.
function "<=" (Idx : Index_Type; Count : Count_Type) return Boolean
is (To_Count (Idx) <= Count)
with Inline,
Pre => Idx in Index_Type'First .. Impl.To_Index (Impl.Last_Count);
procedure Reserve_Capacity
(Self : in out Base_Vector'Class; Capacity : Count_Type)
renames Impl.Reserve_Capacity;
-- Make sure the vector is at least big enough to contain Capacity items
-- (the vector must also be big enough to contain all its current
-- elements)
-- If you insert more items, the vector might be resized to a bigger
-- capacity (when using unbounded nodes, for instance).
-- If you remove items, a vector is never resized.
-- If you clear the vector, it's capacity is reset to 0 and memory is
-- freed if possible.
procedure Shrink_To_Fit (Self : in out Base_Vector'Class)
renames Impl.Shrink_To_Fit;
-- Resize the vector to fit its number of elements. This might free
-- memory. This changes the capacity, but not the length of the vector.
procedure Resize
(Self : in out Base_Vector'Class;
Length : Count_Type;
Element : Storage.Elements.Element_Type)
renames Impl.Resize;
-- Resize the container so that it contains Length elements.
-- If Length is smaller than the current container length, Self is
-- reduced to its first Length elements, destroying the other elements.
-- This does not change the capacity of the vector.
-- If Length is greater than the current container length, new elements
-- are added as needed, as copied of Element. This might also extend
-- the capacity of the vector if needed.
function Length (Self : Base_Vector'Class) return Count_Type
renames Impl.Length;
-- Return the number of elements in Self.
function Is_Empty (Self : Base_Vector'Class) return Boolean
renames Impl.Is_Empty;
-- Whether the vector is empty
function Last (Self : Base_Vector'Class) return Extended_Index
renames Impl.Last;
-- Return the index of the last element in the vector.
-- For a null vector, this returns (Index_Type'First - 1), so that it is
-- always possible to write:
-- for Idx in Index_Type'First .. Self.Last loop
-- end loop;
procedure Append
(Self : in out Base_Vector'Class;
Element : Element_Type;
Count : Count_Type := 1)
renames Impl.Append;
-- Append Count copies of Element to the vector, increasing the capacity
-- as needed.
procedure Insert
(Self : in out Base_Vector'Class;
Before : Index_Type;
Element : Element_Type;
Count : Count_Type := 1)
renames Impl.Insert;
-- Insert Count copies of Element starting at position before.
-- Complexity: O(n)
procedure Replace_Element
(Self : in out Base_Vector'Class;
Index : Index_Type;
New_Item : Element_Type)
renames Impl.Replace_Element;
-- Replace the element at the given position.
procedure Swap
(Self : in out Base_Vector'Class;
Left, Right : Index_Type)
renames Impl.Swap;
-- Efficiently swap the elements at the two positions.
-- For large elements, this will be more efficient than retrieving them
-- and storing them again (which might involve the secondary stack, or
-- allocating and freeing elements).
procedure Clear (Self : in out Base_Vector'Class)
renames Impl.Clear;
-- Remove all contents from the vector.
procedure Delete
(Self : in out Base_Vector'Class;
Index : Index_Type;
Count : Count_Type := 1)
renames Impl.Delete;
-- Remove Count elements, starting at Index.
-- Unless you are removing the last element (see Delete_Last), this is an
-- inefficient operation since it needs to copy all the elements after
-- the one being removed.
procedure Delete_Last (Self : in out Base_Vector'Class)
renames Impl.Delete_Last;
-- Remove the last element from the vector.
-- The vector is not resized, so it will keep its current capacity, for
-- efficient insertion of future elements. You can call Shrink_To_Fit.
-- Existing cursors are still valid after this call (except one that
-- was pointing to the last element, of course).
function Last_Element
(Self : Base_Vector'Class) return Constant_Returned_Type
renames Impl.Last_Element;
-- Return the last element in the vector.
procedure Assign
(Self : in out Base_Vector'Class; Source : Base_Vector'Class)
renames Impl.Assign;
-- Replace all elements of Self with a copy of the elements of Source.
-- When the list is controlled, this has the same behavior as calling
-- Self := Source.
function First (Self : Base_Vector'Class) return Cursor
renames Impl.First;
function Element
(Self : Base_Vector'Class; Position : Cursor)
return Constant_Returned_Type
renames Impl.Element;
function Has_Element
(Self : Base_Vector'Class; Position : Cursor) return Boolean
renames Impl.Has_Element;
function Next
(Self : Base_Vector'Class; Position : Cursor) return Cursor
renames Impl.Next;
function Previous
(Self : Base_Vector'Class; Position : Cursor) return Cursor
renames Impl.Previous;
-- We pass the container explicitly for the sake of writing the pre
-- and post conditions.
-- Complexity: constant for all cursor operations.
procedure Next (Self : Base_Vector'Class; Position : in out Cursor)
renames Impl.Next;
-- Modifies Position in place.
function Reference
(Self : Base_Vector'Class; Position : Index_Type)
return Returned_Type
renames Impl.Reference;
-- Return a reference to the element at the given position. The notion
-- of reference depends on the storage type chosen for the vector, and
-- might instead return a copy. A reference will thus be in general
-- more efficient than a simple copy, and will never be worse.
use type Element_Type;
function As_Element
(Self : Base_Vector'Class; Position : Cursor) return Element_Type
-- Return a copy of the element at the given position.
is (Storage.Elements.To_Element (Element (Self, Position)))
with
Pre => Has_Element (Self, Position),
Post => As_Element'Result = Element (Impl.Model (Self), Position);
pragma Annotate (GNATprove, Inline_For_Proof, As_Element);
------------------
-- for-of loops --
------------------
type Vector is new Base_Vector with null record
with Constant_Indexing => Constant_Reference,
Iterable => (First => First_Primitive,
Next => Next_Primitive,
Has_Element => Has_Element_Primitive,
Element => Element_Primitive);
function Constant_Reference
(Self : Vector; Position : Index_Type) return Constant_Returned_Type
is (Element (Self, Position))
with Inline, Pre'Class => Position <= Last (Self);
-----------
-- Model --
-----------
-- The following subprograms are used to write loop invariants for SPARK
use type Impl.M.Sequence;
function Model (Self : Vector'Class) return Impl.M.Sequence
is (Impl.Model (Self))
with Ghost;
pragma Annotate (GNATprove, Iterable_For_Proof, "Model", Model);
function Element (S : Impl.M.Sequence; I : Index_Type) return Element_Type
renames Impl.Element;
-------------
-- Cursors --
-------------
package Cursors is
function Index_First (Self : Base_Vector'Class) return Index_Type
is (Index_Type'First) with Inline;
function Distance (Left, Right : Index_Type) return Integer
is (Integer (To_Count (Left)) - Integer (To_Count (Right)))
with Pre =>
Left in Index_Type'First .. Impl.To_Index (Impl.Last_Count)
and then
Right in Index_Type'First .. Impl.To_Index (Impl.Last_Count);
function "+" (Left : Index_Type; N : Integer) return Extended_Index
is (Impl.To_Index (Count_Type (Integer (To_Count (Left)) + N)))
with Pre =>
-- N could be negative to move backward, and we must return
-- Extended_Index'First if Left is already on first element
Left in Index_Type'First .. Impl.To_Index (Impl.Last_Count)
and then N in Integer
(Extended_Index'Pos (Extended_Index'First) - To_Count (Left)) ..
Integer (Impl.Last_Count - To_Count (Left));
package Random_Access is new Conts.Cursors.Random_Access_Cursors
(Container_Type => Base_Vector'Class,
Index_Type => Extended_Index,
No_Element => Impl.No_Index,
First => Index_First,
Last => Last,
Distance => Distance,
"+" => "+");
package Bidirectional is new Conts.Cursors.Bidirectional_Cursors
(Container_Type => Base_Vector'Class,
Cursor_Type => Cursor,
No_Element => No_Element,
First => First,
Has_Element => Has_Element,
Next => Next,
Previous => Previous);
package Forward renames Bidirectional.Forward;
end Cursors;
-------------------------
-- Getters and setters --
-------------------------
package Maps is
package Element is new Conts.Properties.Read_Only_Maps
(Cursors.Forward.Container, Cursors.Forward.Cursor,
Element_Type, As_Element);
package Constant_Returned is new Conts.Properties.Read_Only_Maps
(Cursors.Forward.Container, Cursors.Forward.Cursor,
Storage.Elements.Constant_Returned, Conts.Vectors.Generics.Element);
package Element_From_Index is new Conts.Properties.Read_Only_Maps
(Cursors.Random_Access.Container, Cursors.Random_Access.Index,
Element_Type, As_Element);
end Maps;
end Conts.Vectors.Generics;
|
burratoo/Acton | Ada | 2,742 | ads | ------------------------------------------------------------------------------------------
-- --
-- OAK CORE SUPPORT PACKAGE --
-- ATMEL AVR --
-- --
-- OAK.CORE_SUPPORT_PACKAGE.CALL_STACK --
-- --
-- Copyright (C) 2012-2021, Patrick Bernardi --
-- --
------------------------------------------------------------------------------------------
with System.Storage_Elements;
package Oak.Core_Support_Package.Call_Stack with Pure is
-- Call_Stack_Size could be defined in the linker script (Enviroment
-- defined variables don't make sense in this system) Call_Stack_Size in
-- Storage_Elements
Call_Stack_Size : constant := 1 * 1024;
Default_Call_Stack_Size : constant := Call_Stack_Size;
Main_Task_Call_Stack_Size : constant := 1 * 1024;
Oak_Call_Stack_Size : constant := 4 * 1024;
-- Call_Stack_Alignment in bytes
Call_Stack_Allignment : constant := 8;
Minimum_Call_Stack_Size : constant := 1 * 512;
Task_Registers_Save_Size : constant := 36;
Stack_Pointer_Size : constant := 2;
Timer_Overhead : constant := 8;
Sleep_Stack_Size : constant := Task_Registers_Save_Size +
Stack_Pointer_Size + Timer_Overhead;
-- Warning! This is not a real variable. It is defined in the linker script
-- and as such does not have any data storage allocated for it. Instead
-- only a memory address is attached.
Stack_Pointer_Init : constant System.Storage_Elements.Storage_Element;
pragma Import (Assembler, Stack_Pointer_Init, "__stack");
--
-- SPRG0 -> Kernel stack pointer
-- SPRG4 -> Task stack pointer.
--
-- Storing Registers on the Stack during a context switch:
-- -----------------------------
-- | | <---
-- | | --
-- | R0 -> R31 | |- 8 bit registers
-- | SREG | --
-- | | <--- Bottom of stack
-- -----------------------------
-- 33 x 8 bit registers -- 33 bytes!
-- Plus need space for the the intruction register at the start.
end Oak.Core_Support_Package.Call_Stack;
|
onox/orka | Ada | 1,812 | ads | -- SPDX-License-Identifier: Apache-2.0
--
-- Copyright (c) 2016 onox <[email protected]>
--
-- Licensed under the Apache License, Version 2.0 (the "License");
-- you may not use this file except in compliance with the License.
-- You may obtain a copy of the License at
--
-- http://www.apache.org/licenses/LICENSE-2.0
--
-- Unless required by applicable law or agreed to in writing, software
-- distributed under the License is distributed on an "AS IS" BASIS,
-- WITHOUT WARRANTIES OR CONDITIONS OF ANY KIND, either express or implied.
-- See the License for the specific language governing permissions and
-- limitations under the License.
with GL.Types;
package GL.Drawing is
pragma Preelaborate;
use GL.Types;
procedure Draw_Arrays
(Mode : Connection_Mode;
Offset, Count : Size;
Instances : Size := 1;
Base_Instance : Size := 0);
procedure Draw_Multiple_Arrays_Indirect
(Mode : Connection_Mode;
Count : Size;
Offset : Size := 0);
procedure Draw_Multiple_Arrays_Indirect_Count
(Mode : Connection_Mode;
Max_Count : Size;
Offset, Count_Offset : Size := 0);
procedure Draw_Elements
(Mode : Connection_Mode;
Count : Size;
Index_Kind : Index_Type;
Index_Offset : Natural;
Instances : Size := 1;
Base_Instance : Size := 0;
Base_Vertex : Size := 0);
procedure Draw_Multiple_Elements_Indirect
(Mode : Connection_Mode;
Index_Kind : Index_Type;
Count : Size;
Offset : Size := 0);
procedure Draw_Multiple_Elements_Indirect_Count
(Mode : Connection_Mode;
Index_Kind : Index_Type;
Max_Count : Size;
Offset, Count_Offset : Size := 0);
end GL.Drawing;
|
Fabien-Chouteau/GESTE | Ada | 155,049 | ads | package GESTE_Fonts.FreeMonoBoldOblique24pt7b is
Font : constant Bitmap_Font_Ref;
private
FreeMonoBoldOblique24pt7bBitmaps : 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#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#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#00#, 16#07#,
16#E0#, 16#00#, 16#00#, 16#03#, 16#FC#, 16#00#, 16#00#, 16#00#, 16#FE#,
16#00#, 16#00#, 16#00#, 16#3F#, 16#80#, 16#00#, 16#00#, 16#0F#, 16#E0#,
16#00#, 16#00#, 16#03#, 16#F8#, 16#00#, 16#00#, 16#01#, 16#FC#, 16#00#,
16#00#, 16#00#, 16#7F#, 16#00#, 16#00#, 16#00#, 16#1F#, 16#C0#, 16#00#,
16#00#, 16#07#, 16#E0#, 16#00#, 16#00#, 16#01#, 16#F8#, 16#00#, 16#00#,
16#00#, 16#7E#, 16#00#, 16#00#, 16#00#, 16#1F#, 16#80#, 16#00#, 16#00#,
16#07#, 16#C0#, 16#00#, 16#00#, 16#03#, 16#F0#, 16#00#, 16#00#, 16#00#,
16#FC#, 16#00#, 16#00#, 16#00#, 16#3E#, 16#00#, 16#00#, 16#00#, 16#0F#,
16#80#, 16#00#, 16#00#, 16#03#, 16#E0#, 16#00#, 16#00#, 16#00#, 16#F0#,
16#00#, 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#78#, 16#00#, 16#00#, 16#00#, 16#3F#, 16#00#, 16#00#,
16#00#, 16#1F#, 16#C0#, 16#00#, 16#00#, 16#07#, 16#F0#, 16#00#, 16#00#,
16#01#, 16#F8#, 16#00#, 16#00#, 16#00#, 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#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#FC#, 16#3F#, 16#00#, 16#00#, 16#3F#, 16#0F#, 16#80#, 16#00#,
16#0F#, 16#C3#, 16#E0#, 16#00#, 16#03#, 16#E0#, 16#F8#, 16#00#, 16#00#,
16#F8#, 16#7C#, 16#00#, 16#00#, 16#3E#, 16#1F#, 16#00#, 16#00#, 16#0F#,
16#07#, 16#C0#, 16#00#, 16#03#, 16#C1#, 16#E0#, 16#00#, 16#00#, 16#F0#,
16#78#, 16#00#, 16#00#, 16#38#, 16#1E#, 16#00#, 16#00#, 16#0E#, 16#07#,
16#00#, 16#00#, 16#03#, 16#81#, 16#C0#, 16#00#, 16#01#, 16#C0#, 16#70#,
16#00#, 16#00#, 16#30#, 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#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#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#E0#, 16#00#, 16#00#, 16#7C#,
16#7C#, 16#00#, 16#00#, 16#1F#, 16#1F#, 16#00#, 16#00#, 16#07#, 16#87#,
16#80#, 16#00#, 16#03#, 16#E3#, 16#E0#, 16#00#, 16#00#, 16#F8#, 16#F8#,
16#00#, 16#00#, 16#3C#, 16#3C#, 16#00#, 16#00#, 16#1F#, 16#1F#, 16#00#,
16#00#, 16#07#, 16#C7#, 16#C0#, 16#00#, 16#01#, 16#F1#, 16#F0#, 16#00#,
16#07#, 16#FF#, 16#FF#, 16#80#, 16#03#, 16#FF#, 16#FF#, 16#E0#, 16#00#,
16#FF#, 16#FF#, 16#F8#, 16#00#, 16#3F#, 16#FF#, 16#FE#, 16#00#, 16#0F#,
16#FF#, 16#FF#, 16#00#, 16#00#, 16#7C#, 16#7C#, 16#00#, 16#00#, 16#1F#,
16#1F#, 16#00#, 16#00#, 16#0F#, 16#87#, 16#80#, 16#00#, 16#03#, 16#E3#,
16#E0#, 16#00#, 16#0F#, 16#FF#, 16#FF#, 16#00#, 16#07#, 16#FF#, 16#FF#,
16#C0#, 16#01#, 16#FF#, 16#FF#, 16#F0#, 16#00#, 16#7F#, 16#FF#, 16#FC#,
16#00#, 16#1F#, 16#FF#, 16#FE#, 16#00#, 16#00#, 16#F8#, 16#78#, 16#00#,
16#00#, 16#3E#, 16#3E#, 16#00#, 16#00#, 16#0F#, 16#8F#, 16#80#, 16#00#,
16#03#, 16#C3#, 16#C0#, 16#00#, 16#01#, 16#F1#, 16#F0#, 16#00#, 16#00#,
16#7C#, 16#7C#, 16#00#, 16#00#, 16#1F#, 16#1F#, 16#00#, 16#00#, 16#07#,
16#87#, 16#80#, 16#00#, 16#03#, 16#E3#, 16#E0#, 16#00#, 16#00#, 16#70#,
16#70#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#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#00#, 16#00#, 16#1E#, 16#00#, 16#00#,
16#00#, 16#0F#, 16#80#, 16#00#, 16#00#, 16#03#, 16#E0#, 16#00#, 16#00#,
16#03#, 16#FC#, 16#00#, 16#00#, 16#03#, 16#FF#, 16#F0#, 16#00#, 16#01#,
16#FF#, 16#FE#, 16#00#, 16#00#, 16#FF#, 16#FF#, 16#80#, 16#00#, 16#7F#,
16#FF#, 16#C0#, 16#00#, 16#3F#, 16#83#, 16#F0#, 16#00#, 16#0F#, 16#80#,
16#7C#, 16#00#, 16#07#, 16#C0#, 16#1E#, 16#00#, 16#01#, 16#F0#, 16#01#,
16#00#, 16#00#, 16#7E#, 16#00#, 16#00#, 16#00#, 16#1F#, 16#F0#, 16#00#,
16#00#, 16#03#, 16#FF#, 16#C0#, 16#00#, 16#00#, 16#FF#, 16#FC#, 16#00#,
16#00#, 16#1F#, 16#FF#, 16#80#, 16#00#, 16#00#, 16#FF#, 16#F0#, 16#00#,
16#00#, 16#03#, 16#FC#, 16#00#, 16#00#, 16#00#, 16#1F#, 16#00#, 16#01#,
16#C0#, 16#07#, 16#E0#, 16#00#, 16#F0#, 16#01#, 16#F0#, 16#00#, 16#3C#,
16#00#, 16#7C#, 16#00#, 16#1F#, 16#80#, 16#3F#, 16#00#, 16#07#, 16#F8#,
16#3F#, 16#80#, 16#01#, 16#FF#, 16#FF#, 16#E0#, 16#00#, 16#7F#, 16#FF#,
16#F0#, 16#00#, 16#1F#, 16#FF#, 16#F0#, 16#00#, 16#07#, 16#FF#, 16#F8#,
16#00#, 16#00#, 16#07#, 16#F0#, 16#00#, 16#00#, 16#00#, 16#F8#, 16#00#,
16#00#, 16#00#, 16#3C#, 16#00#, 16#00#, 16#00#, 16#0F#, 16#00#, 16#00#,
16#00#, 16#07#, 16#C0#, 16#00#, 16#00#, 16#01#, 16#F0#, 16#00#, 16#00#,
16#00#, 16#78#, 16#00#, 16#00#, 16#00#, 16#0E#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#3E#, 16#00#,
16#00#, 16#00#, 16#3F#, 16#E0#, 16#00#, 16#00#, 16#1F#, 16#FC#, 16#00#,
16#00#, 16#0F#, 16#0F#, 16#00#, 16#00#, 16#03#, 16#81#, 16#C0#, 16#00#,
16#01#, 16#C0#, 16#70#, 16#00#, 16#00#, 16#70#, 16#1C#, 16#00#, 16#00#,
16#1C#, 16#07#, 16#00#, 16#00#, 16#07#, 16#03#, 16#80#, 16#00#, 16#01#,
16#E1#, 16#E0#, 16#00#, 16#00#, 16#7F#, 16#F0#, 16#00#, 16#00#, 16#0F#,
16#F8#, 16#7C#, 16#00#, 16#00#, 16#F8#, 16#FF#, 16#00#, 16#00#, 16#01#,
16#FF#, 16#00#, 16#00#, 16#03#, 16#FE#, 16#00#, 16#00#, 16#0F#, 16#FC#,
16#00#, 16#00#, 16#1F#, 16#F0#, 16#00#, 16#00#, 16#0F#, 16#E1#, 16#F0#,
16#00#, 16#03#, 16#C1#, 16#FF#, 16#00#, 16#00#, 16#00#, 16#FF#, 16#E0#,
16#00#, 16#00#, 16#78#, 16#78#, 16#00#, 16#00#, 16#1C#, 16#0E#, 16#00#,
16#00#, 16#0E#, 16#03#, 16#80#, 16#00#, 16#03#, 16#80#, 16#E0#, 16#00#,
16#00#, 16#E0#, 16#38#, 16#00#, 16#00#, 16#38#, 16#1C#, 16#00#, 16#00#,
16#0F#, 16#0F#, 16#00#, 16#00#, 16#01#, 16#FF#, 16#80#, 16#00#, 16#00#,
16#7F#, 16#C0#, 16#00#, 16#00#, 16#07#, 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#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#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#00#, 16#00#, 16#7F#, 16#E0#, 16#00#, 16#00#, 16#3F#,
16#F8#, 16#00#, 16#00#, 16#1F#, 16#FE#, 16#00#, 16#00#, 16#0F#, 16#FF#,
16#80#, 16#00#, 16#07#, 16#E7#, 16#80#, 16#00#, 16#01#, 16#F0#, 16#00#,
16#00#, 16#00#, 16#F8#, 16#00#, 16#00#, 16#00#, 16#3E#, 16#00#, 16#00#,
16#00#, 16#0F#, 16#C0#, 16#00#, 16#00#, 16#03#, 16#F0#, 16#00#, 16#00#,
16#00#, 16#7C#, 16#00#, 16#00#, 16#00#, 16#1F#, 16#80#, 16#00#, 16#00#,
16#1F#, 16#E0#, 16#00#, 16#00#, 16#0F#, 16#FC#, 16#7C#, 16#00#, 16#07#,
16#FF#, 16#3F#, 16#00#, 16#03#, 16#F7#, 16#EF#, 16#C0#, 16#00#, 16#F8#,
16#FF#, 16#E0#, 16#00#, 16#7C#, 16#3F#, 16#F0#, 16#00#, 16#1F#, 16#0F#,
16#F8#, 16#00#, 16#07#, 16#C1#, 16#FC#, 16#00#, 16#01#, 16#F0#, 16#7F#,
16#00#, 16#00#, 16#7E#, 16#1F#, 16#F0#, 16#00#, 16#1F#, 16#FF#, 16#FC#,
16#00#, 16#07#, 16#FF#, 16#FF#, 16#00#, 16#00#, 16#FF#, 16#FF#, 16#C0#,
16#00#, 16#1F#, 16#FB#, 16#E0#, 16#00#, 16#01#, 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#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#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#E0#, 16#00#, 16#00#, 16#01#, 16#F8#, 16#00#,
16#00#, 16#00#, 16#7C#, 16#00#, 16#00#, 16#00#, 16#1F#, 16#00#, 16#00#,
16#00#, 16#07#, 16#C0#, 16#00#, 16#00#, 16#01#, 16#E0#, 16#00#, 16#00#,
16#00#, 16#78#, 16#00#, 16#00#, 16#00#, 16#1E#, 16#00#, 16#00#, 16#00#,
16#0F#, 16#00#, 16#00#, 16#00#, 16#03#, 16#C0#, 16#00#, 16#00#, 16#00#,
16#F0#, 16#00#, 16#00#, 16#00#, 16#38#, 16#00#, 16#00#, 16#00#, 16#0E#,
16#00#, 16#00#, 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#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#0C#, 16#00#, 16#00#, 16#00#, 16#07#, 16#80#, 16#00#, 16#00#,
16#03#, 16#E0#, 16#00#, 16#00#, 16#01#, 16#F0#, 16#00#, 16#00#, 16#00#,
16#FC#, 16#00#, 16#00#, 16#00#, 16#7E#, 16#00#, 16#00#, 16#00#, 16#1F#,
16#00#, 16#00#, 16#00#, 16#0F#, 16#80#, 16#00#, 16#00#, 16#07#, 16#E0#,
16#00#, 16#00#, 16#01#, 16#F0#, 16#00#, 16#00#, 16#00#, 16#F8#, 16#00#,
16#00#, 16#00#, 16#7E#, 16#00#, 16#00#, 16#00#, 16#1F#, 16#00#, 16#00#,
16#00#, 16#07#, 16#C0#, 16#00#, 16#00#, 16#03#, 16#E0#, 16#00#, 16#00#,
16#00#, 16#F8#, 16#00#, 16#00#, 16#00#, 16#7E#, 16#00#, 16#00#, 16#00#,
16#1F#, 16#00#, 16#00#, 16#00#, 16#07#, 16#C0#, 16#00#, 16#00#, 16#01#,
16#F0#, 16#00#, 16#00#, 16#00#, 16#7C#, 16#00#, 16#00#, 16#00#, 16#3F#,
16#00#, 16#00#, 16#00#, 16#0F#, 16#C0#, 16#00#, 16#00#, 16#03#, 16#F0#,
16#00#, 16#00#, 16#00#, 16#FC#, 16#00#, 16#00#, 16#00#, 16#3F#, 16#00#,
16#00#, 16#00#, 16#0F#, 16#C0#, 16#00#, 16#00#, 16#01#, 16#F0#, 16#00#,
16#00#, 16#00#, 16#7C#, 16#00#, 16#00#, 16#00#, 16#1F#, 16#00#, 16#00#,
16#00#, 16#07#, 16#E0#, 16#00#, 16#00#, 16#01#, 16#F8#, 16#00#, 16#00#,
16#00#, 16#3E#, 16#00#, 16#00#, 16#00#, 16#0F#, 16#C0#, 16#00#, 16#00#,
16#03#, 16#F0#, 16#00#, 16#00#, 16#00#, 16#7C#, 16#00#, 16#00#, 16#00#,
16#0E#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#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#00#, 16#00#, 16#F0#, 16#00#, 16#00#,
16#00#, 16#7E#, 16#00#, 16#00#, 16#00#, 16#1F#, 16#80#, 16#00#, 16#00#,
16#03#, 16#E0#, 16#00#, 16#00#, 16#00#, 16#FC#, 16#00#, 16#00#, 16#00#,
16#3F#, 16#00#, 16#00#, 16#00#, 16#07#, 16#C0#, 16#00#, 16#00#, 16#01#,
16#F0#, 16#00#, 16#00#, 16#00#, 16#7E#, 16#00#, 16#00#, 16#00#, 16#1F#,
16#80#, 16#00#, 16#00#, 16#03#, 16#E0#, 16#00#, 16#00#, 16#00#, 16#F8#,
16#00#, 16#00#, 16#00#, 16#3E#, 16#00#, 16#00#, 16#00#, 16#0F#, 16#80#,
16#00#, 16#00#, 16#03#, 16#E0#, 16#00#, 16#00#, 16#00#, 16#F8#, 16#00#,
16#00#, 16#00#, 16#7E#, 16#00#, 16#00#, 16#00#, 16#1F#, 16#00#, 16#00#,
16#00#, 16#07#, 16#C0#, 16#00#, 16#00#, 16#01#, 16#F0#, 16#00#, 16#00#,
16#00#, 16#FC#, 16#00#, 16#00#, 16#00#, 16#3E#, 16#00#, 16#00#, 16#00#,
16#0F#, 16#80#, 16#00#, 16#00#, 16#07#, 16#E0#, 16#00#, 16#00#, 16#01#,
16#F0#, 16#00#, 16#00#, 16#00#, 16#FC#, 16#00#, 16#00#, 16#00#, 16#3E#,
16#00#, 16#00#, 16#00#, 16#1F#, 16#00#, 16#00#, 16#00#, 16#0F#, 16#C0#,
16#00#, 16#00#, 16#03#, 16#E0#, 16#00#, 16#00#, 16#01#, 16#F0#, 16#00#,
16#00#, 16#00#, 16#FC#, 16#00#, 16#00#, 16#00#, 16#7E#, 16#00#, 16#00#,
16#00#, 16#1F#, 16#00#, 16#00#, 16#00#, 16#0F#, 16#80#, 16#00#, 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#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#03#,
16#C0#, 16#00#, 16#00#, 16#00#, 16#F0#, 16#00#, 16#00#, 16#00#, 16#7C#,
16#00#, 16#00#, 16#00#, 16#1F#, 16#00#, 16#00#, 16#00#, 16#07#, 16#C0#,
16#00#, 16#00#, 16#41#, 16#E0#, 16#40#, 16#00#, 16#7E#, 16#79#, 16#F8#,
16#00#, 16#3F#, 16#FF#, 16#FE#, 16#00#, 16#0F#, 16#FF#, 16#FF#, 16#80#,
16#01#, 16#FF#, 16#FF#, 16#C0#, 16#00#, 16#1F#, 16#FF#, 16#80#, 16#00#,
16#00#, 16#FF#, 16#00#, 16#00#, 16#00#, 16#7F#, 16#C0#, 16#00#, 16#00#,
16#3F#, 16#F8#, 16#00#, 16#00#, 16#1F#, 16#FE#, 16#00#, 16#00#, 16#0F#,
16#CF#, 16#C0#, 16#00#, 16#03#, 16#E3#, 16#F0#, 16#00#, 16#00#, 16#F0#,
16#7C#, 16#00#, 16#00#, 16#38#, 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#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#0E#, 16#00#, 16#00#, 16#00#,
16#07#, 16#C0#, 16#00#, 16#00#, 16#01#, 16#E0#, 16#00#, 16#00#, 16#00#,
16#78#, 16#00#, 16#00#, 16#00#, 16#3E#, 16#00#, 16#00#, 16#00#, 16#0F#,
16#80#, 16#00#, 16#00#, 16#03#, 16#E0#, 16#00#, 16#00#, 16#00#, 16#F0#,
16#00#, 16#00#, 16#00#, 16#7C#, 16#00#, 16#00#, 16#00#, 16#1F#, 16#00#,
16#00#, 16#0F#, 16#FF#, 16#FF#, 16#E0#, 16#07#, 16#FF#, 16#FF#, 16#F8#,
16#01#, 16#FF#, 16#FF#, 16#FE#, 16#00#, 16#7F#, 16#FF#, 16#FF#, 16#80#,
16#1F#, 16#FF#, 16#FF#, 16#C0#, 16#00#, 16#03#, 16#E0#, 16#00#, 16#00#,
16#00#, 16#F0#, 16#00#, 16#00#, 16#00#, 16#3C#, 16#00#, 16#00#, 16#00#,
16#1F#, 16#00#, 16#00#, 16#00#, 16#07#, 16#C0#, 16#00#, 16#00#, 16#01#,
16#F0#, 16#00#, 16#00#, 16#00#, 16#78#, 16#00#, 16#00#, 16#00#, 16#1E#,
16#00#, 16#00#, 16#00#, 16#0F#, 16#80#, 16#00#, 16#00#, 16#03#, 16#E0#,
16#00#, 16#00#, 16#00#, 16#70#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#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#80#, 16#00#,
16#00#, 16#07#, 16#E0#, 16#00#, 16#00#, 16#03#, 16#F0#, 16#00#, 16#00#,
16#00#, 16#F8#, 16#00#, 16#00#, 16#00#, 16#7E#, 16#00#, 16#00#, 16#00#,
16#1F#, 16#00#, 16#00#, 16#00#, 16#0F#, 16#80#, 16#00#, 16#00#, 16#03#,
16#C0#, 16#00#, 16#00#, 16#01#, 16#F0#, 16#00#, 16#00#, 16#00#, 16#78#,
16#00#, 16#00#, 16#00#, 16#1C#, 16#00#, 16#00#, 16#00#, 16#0E#, 16#00#,
16#00#, 16#00#, 16#03#, 16#80#, 16#00#, 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#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#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#FF#, 16#FF#, 16#E0#,
16#07#, 16#FF#, 16#FF#, 16#F8#, 16#01#, 16#FF#, 16#FF#, 16#FE#, 16#00#,
16#7F#, 16#FF#, 16#FF#, 16#80#, 16#1F#, 16#FF#, 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#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#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#00#, 16#00#, 16#3F#, 16#00#, 16#00#, 16#00#,
16#1F#, 16#C0#, 16#00#, 16#00#, 16#07#, 16#F0#, 16#00#, 16#00#, 16#01#,
16#F8#, 16#00#, 16#00#, 16#00#, 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#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#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#00#, 16#00#, 16#78#, 16#00#,
16#00#, 16#00#, 16#3E#, 16#00#, 16#00#, 16#00#, 16#1F#, 16#00#, 16#00#,
16#00#, 16#07#, 16#C0#, 16#00#, 16#00#, 16#03#, 16#E0#, 16#00#, 16#00#,
16#01#, 16#F0#, 16#00#, 16#00#, 16#00#, 16#7C#, 16#00#, 16#00#, 16#00#,
16#3E#, 16#00#, 16#00#, 16#00#, 16#1F#, 16#00#, 16#00#, 16#00#, 16#07#,
16#C0#, 16#00#, 16#00#, 16#03#, 16#E0#, 16#00#, 16#00#, 16#01#, 16#F0#,
16#00#, 16#00#, 16#00#, 16#FC#, 16#00#, 16#00#, 16#00#, 16#3E#, 16#00#,
16#00#, 16#00#, 16#1F#, 16#00#, 16#00#, 16#00#, 16#0F#, 16#C0#, 16#00#,
16#00#, 16#03#, 16#E0#, 16#00#, 16#00#, 16#01#, 16#F0#, 16#00#, 16#00#,
16#00#, 16#FC#, 16#00#, 16#00#, 16#00#, 16#3E#, 16#00#, 16#00#, 16#00#,
16#1F#, 16#00#, 16#00#, 16#00#, 16#0F#, 16#80#, 16#00#, 16#00#, 16#03#,
16#E0#, 16#00#, 16#00#, 16#01#, 16#F0#, 16#00#, 16#00#, 16#00#, 16#F8#,
16#00#, 16#00#, 16#00#, 16#3E#, 16#00#, 16#00#, 16#00#, 16#1F#, 16#00#,
16#00#, 16#00#, 16#0F#, 16#80#, 16#00#, 16#00#, 16#07#, 16#E0#, 16#00#,
16#00#, 16#01#, 16#F0#, 16#00#, 16#00#, 16#00#, 16#F8#, 16#00#, 16#00#,
16#00#, 16#7E#, 16#00#, 16#00#, 16#00#, 16#1F#, 16#00#, 16#00#, 16#00#,
16#0F#, 16#80#, 16#00#, 16#00#, 16#03#, 16#E0#, 16#00#, 16#00#, 16#01#,
16#F0#, 16#00#, 16#00#, 16#00#, 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#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#1F#, 16#80#,
16#00#, 16#00#, 16#1F#, 16#F8#, 16#00#, 16#00#, 16#0F#, 16#FF#, 16#00#,
16#00#, 16#0F#, 16#FF#, 16#E0#, 16#00#, 16#07#, 16#FF#, 16#F8#, 16#00#,
16#01#, 16#F8#, 16#7F#, 16#00#, 16#00#, 16#FC#, 16#07#, 16#C0#, 16#00#,
16#7E#, 16#01#, 16#F0#, 16#00#, 16#1F#, 16#00#, 16#7C#, 16#00#, 16#0F#,
16#80#, 16#0F#, 16#00#, 16#03#, 16#E0#, 16#03#, 16#C0#, 16#00#, 16#F8#,
16#01#, 16#F0#, 16#00#, 16#3C#, 16#00#, 16#7C#, 16#00#, 16#1F#, 16#00#,
16#1F#, 16#00#, 16#07#, 16#C0#, 16#07#, 16#C0#, 16#01#, 16#F0#, 16#01#,
16#E0#, 16#00#, 16#78#, 16#00#, 16#F8#, 16#00#, 16#1E#, 16#00#, 16#3E#,
16#00#, 16#0F#, 16#80#, 16#0F#, 16#80#, 16#03#, 16#E0#, 16#03#, 16#C0#,
16#00#, 16#F8#, 16#01#, 16#F0#, 16#00#, 16#3E#, 16#00#, 16#7C#, 16#00#,
16#0F#, 16#80#, 16#3E#, 16#00#, 16#03#, 16#E0#, 16#0F#, 16#80#, 16#00#,
16#FC#, 16#07#, 16#C0#, 16#00#, 16#1F#, 16#87#, 16#F0#, 16#00#, 16#07#,
16#FF#, 16#F8#, 16#00#, 16#01#, 16#FF#, 16#FC#, 16#00#, 16#00#, 16#3F#,
16#FE#, 16#00#, 16#00#, 16#07#, 16#FE#, 16#00#, 16#00#, 16#00#, 16#7E#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#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#80#, 16#00#, 16#00#, 16#0F#, 16#E0#, 16#00#, 16#00#, 16#0F#,
16#F0#, 16#00#, 16#00#, 16#0F#, 16#FC#, 16#00#, 16#00#, 16#07#, 16#FF#,
16#00#, 16#00#, 16#07#, 16#F7#, 16#C0#, 16#00#, 16#01#, 16#F9#, 16#E0#,
16#00#, 16#00#, 16#78#, 16#F8#, 16#00#, 16#00#, 16#00#, 16#3E#, 16#00#,
16#00#, 16#00#, 16#0F#, 16#80#, 16#00#, 16#00#, 16#03#, 16#E0#, 16#00#,
16#00#, 16#00#, 16#F0#, 16#00#, 16#00#, 16#00#, 16#7C#, 16#00#, 16#00#,
16#00#, 16#1F#, 16#00#, 16#00#, 16#00#, 16#07#, 16#C0#, 16#00#, 16#00#,
16#01#, 16#F0#, 16#00#, 16#00#, 16#00#, 16#78#, 16#00#, 16#00#, 16#00#,
16#3E#, 16#00#, 16#00#, 16#00#, 16#0F#, 16#80#, 16#00#, 16#00#, 16#03#,
16#E0#, 16#00#, 16#00#, 16#00#, 16#F0#, 16#00#, 16#00#, 16#00#, 16#7C#,
16#00#, 16#00#, 16#00#, 16#1F#, 16#00#, 16#00#, 16#00#, 16#07#, 16#C0#,
16#00#, 16#00#, 16#01#, 16#F0#, 16#00#, 16#00#, 16#3F#, 16#FF#, 16#F0#,
16#00#, 16#1F#, 16#FF#, 16#FE#, 16#00#, 16#0F#, 16#FF#, 16#FF#, 16#80#,
16#03#, 16#FF#, 16#FF#, 16#C0#, 16#00#, 16#7F#, 16#FF#, 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#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#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#80#, 16#00#, 16#00#, 16#3F#, 16#F8#, 16#00#,
16#00#, 16#3F#, 16#FF#, 16#00#, 16#00#, 16#1F#, 16#FF#, 16#E0#, 16#00#,
16#0F#, 16#FF#, 16#FC#, 16#00#, 16#03#, 16#F0#, 16#7F#, 16#00#, 16#01#,
16#F0#, 16#07#, 16#C0#, 16#00#, 16#FC#, 16#01#, 16#F0#, 16#00#, 16#3E#,
16#00#, 16#7C#, 16#00#, 16#0F#, 16#00#, 16#1F#, 16#00#, 16#00#, 16#00#,
16#07#, 16#C0#, 16#00#, 16#00#, 16#03#, 16#E0#, 16#00#, 16#00#, 16#01#,
16#F8#, 16#00#, 16#00#, 16#00#, 16#FC#, 16#00#, 16#00#, 16#00#, 16#FE#,
16#00#, 16#00#, 16#00#, 16#7F#, 16#00#, 16#00#, 16#00#, 16#3F#, 16#80#,
16#00#, 16#00#, 16#3F#, 16#C0#, 16#00#, 16#00#, 16#1F#, 16#C0#, 16#00#,
16#00#, 16#1F#, 16#E0#, 16#00#, 16#00#, 16#0F#, 16#F0#, 16#00#, 16#00#,
16#0F#, 16#F0#, 16#00#, 16#00#, 16#07#, 16#F8#, 16#00#, 16#00#, 16#07#,
16#F8#, 16#07#, 16#00#, 16#03#, 16#FC#, 16#03#, 16#E0#, 16#01#, 16#FF#,
16#FF#, 16#F8#, 16#00#, 16#7F#, 16#FF#, 16#FE#, 16#00#, 16#1F#, 16#FF#,
16#FF#, 16#00#, 16#07#, 16#FF#, 16#FF#, 16#C0#, 16#01#, 16#FF#, 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#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#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#C0#, 16#00#, 16#00#, 16#7F#,
16#FC#, 16#00#, 16#00#, 16#3F#, 16#FF#, 16#80#, 16#00#, 16#3F#, 16#FF#,
16#F0#, 16#00#, 16#0F#, 16#FF#, 16#FC#, 16#00#, 16#03#, 16#E0#, 16#3F#,
16#00#, 16#00#, 16#E0#, 16#07#, 16#E0#, 16#00#, 16#00#, 16#00#, 16#F8#,
16#00#, 16#00#, 16#00#, 16#3C#, 16#00#, 16#00#, 16#00#, 16#1F#, 16#00#,
16#00#, 16#00#, 16#0F#, 16#C0#, 16#00#, 16#00#, 16#07#, 16#E0#, 16#00#,
16#00#, 16#7F#, 16#F0#, 16#00#, 16#00#, 16#3F#, 16#F8#, 16#00#, 16#00#,
16#0F#, 16#F8#, 16#00#, 16#00#, 16#03#, 16#FF#, 16#00#, 16#00#, 16#00#,
16#FF#, 16#E0#, 16#00#, 16#00#, 16#01#, 16#FC#, 16#00#, 16#00#, 16#00#,
16#1F#, 16#80#, 16#00#, 16#00#, 16#03#, 16#E0#, 16#00#, 16#00#, 16#00#,
16#F8#, 16#00#, 16#00#, 16#00#, 16#3E#, 16#00#, 16#00#, 16#00#, 16#0F#,
16#00#, 16#00#, 16#00#, 16#07#, 16#C0#, 16#00#, 16#00#, 16#03#, 16#F0#,
16#00#, 16#70#, 16#03#, 16#F8#, 16#00#, 16#3F#, 16#FF#, 16#FC#, 16#00#,
16#0F#, 16#FF#, 16#FE#, 16#00#, 16#03#, 16#FF#, 16#FF#, 16#00#, 16#00#,
16#7F#, 16#FF#, 16#80#, 16#00#, 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#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#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#80#, 16#00#,
16#00#, 16#0F#, 16#E0#, 16#00#, 16#00#, 16#07#, 16#F8#, 16#00#, 16#00#,
16#03#, 16#FC#, 16#00#, 16#00#, 16#01#, 16#FF#, 16#00#, 16#00#, 16#00#,
16#FF#, 16#C0#, 16#00#, 16#00#, 16#7D#, 16#F0#, 16#00#, 16#00#, 16#1E#,
16#7C#, 16#00#, 16#00#, 16#0F#, 16#BE#, 16#00#, 16#00#, 16#07#, 16#CF#,
16#80#, 16#00#, 16#03#, 16#E3#, 16#E0#, 16#00#, 16#01#, 16#F0#, 16#F8#,
16#00#, 16#00#, 16#F8#, 16#3C#, 16#00#, 16#00#, 16#7E#, 16#1F#, 16#00#,
16#00#, 16#1F#, 16#07#, 16#C0#, 16#00#, 16#0F#, 16#81#, 16#F0#, 16#00#,
16#07#, 16#C0#, 16#78#, 16#00#, 16#03#, 16#FF#, 16#FF#, 16#80#, 16#00#,
16#FF#, 16#FF#, 16#F0#, 16#00#, 16#7F#, 16#FF#, 16#FC#, 16#00#, 16#1F#,
16#FF#, 16#FE#, 16#00#, 16#07#, 16#FF#, 16#FF#, 16#00#, 16#00#, 16#00#,
16#1F#, 16#00#, 16#00#, 16#00#, 16#7F#, 16#F0#, 16#00#, 16#00#, 16#3F#,
16#FC#, 16#00#, 16#00#, 16#0F#, 16#FF#, 16#00#, 16#00#, 16#03#, 16#FF#,
16#C0#, 16#00#, 16#00#, 16#FF#, 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#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#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#FC#, 16#00#, 16#00#, 16#FF#, 16#FF#, 16#80#, 16#00#, 16#7F#, 16#FF#,
16#E0#, 16#00#, 16#1F#, 16#FF#, 16#F0#, 16#00#, 16#07#, 16#FF#, 16#F8#,
16#00#, 16#01#, 16#E0#, 16#00#, 16#00#, 16#00#, 16#F8#, 16#00#, 16#00#,
16#00#, 16#3E#, 16#00#, 16#00#, 16#00#, 16#0F#, 16#80#, 16#00#, 16#00#,
16#03#, 16#E0#, 16#00#, 16#00#, 16#00#, 16#F3#, 16#F0#, 16#00#, 16#00#,
16#7F#, 16#FF#, 16#00#, 16#00#, 16#1F#, 16#FF#, 16#E0#, 16#00#, 16#07#,
16#FF#, 16#FC#, 16#00#, 16#01#, 16#FF#, 16#FF#, 16#00#, 16#00#, 16#7C#,
16#0F#, 16#E0#, 16#00#, 16#00#, 16#00#, 16#F8#, 16#00#, 16#00#, 16#00#,
16#3E#, 16#00#, 16#00#, 16#00#, 16#0F#, 16#80#, 16#00#, 16#00#, 16#03#,
16#E0#, 16#00#, 16#00#, 16#00#, 16#F8#, 16#00#, 16#00#, 16#00#, 16#3E#,
16#00#, 16#00#, 16#00#, 16#0F#, 16#00#, 16#00#, 16#00#, 16#07#, 16#C0#,
16#00#, 16#00#, 16#03#, 16#F0#, 16#00#, 16#78#, 16#03#, 16#F8#, 16#00#,
16#3F#, 16#FF#, 16#FC#, 16#00#, 16#0F#, 16#FF#, 16#FE#, 16#00#, 16#03#,
16#FF#, 16#FF#, 16#00#, 16#00#, 16#7F#, 16#FF#, 16#00#, 16#00#, 16#03#,
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#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#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#00#, 16#FF#, 16#E0#, 16#00#,
16#00#, 16#FF#, 16#F8#, 16#00#, 16#00#, 16#FF#, 16#FE#, 16#00#, 16#00#,
16#7F#, 16#FF#, 16#80#, 16#00#, 16#3F#, 16#C1#, 16#C0#, 16#00#, 16#1F#,
16#C0#, 16#00#, 16#00#, 16#0F#, 16#E0#, 16#00#, 16#00#, 16#07#, 16#E0#,
16#00#, 16#00#, 16#01#, 16#F0#, 16#00#, 16#00#, 16#00#, 16#F8#, 16#00#,
16#00#, 16#00#, 16#7E#, 16#3E#, 16#00#, 16#00#, 16#1F#, 16#3F#, 16#C0#,
16#00#, 16#07#, 16#BF#, 16#F8#, 16#00#, 16#03#, 16#FF#, 16#FF#, 16#00#,
16#00#, 16#FF#, 16#FF#, 16#E0#, 16#00#, 16#3F#, 16#E1#, 16#F8#, 16#00#,
16#0F#, 16#E0#, 16#3E#, 16#00#, 16#07#, 16#F0#, 16#0F#, 16#80#, 16#01#,
16#F8#, 16#03#, 16#E0#, 16#00#, 16#7C#, 16#00#, 16#F8#, 16#00#, 16#1F#,
16#00#, 16#3E#, 16#00#, 16#07#, 16#C0#, 16#0F#, 16#80#, 16#01#, 16#F8#,
16#07#, 16#C0#, 16#00#, 16#7E#, 16#01#, 16#F0#, 16#00#, 16#0F#, 16#C1#,
16#F8#, 16#00#, 16#03#, 16#FF#, 16#FE#, 16#00#, 16#00#, 16#FF#, 16#FF#,
16#00#, 16#00#, 16#1F#, 16#FF#, 16#80#, 16#00#, 16#03#, 16#FF#, 16#80#,
16#00#, 16#00#, 16#3F#, 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#0F#, 16#FF#, 16#FF#, 16#00#, 16#07#, 16#FF#, 16#FF#,
16#C0#, 16#01#, 16#FF#, 16#FF#, 16#F0#, 16#00#, 16#7F#, 16#FF#, 16#F8#,
16#00#, 16#1F#, 16#FF#, 16#FE#, 16#00#, 16#07#, 16#80#, 16#0F#, 16#80#,
16#01#, 16#C0#, 16#07#, 16#C0#, 16#00#, 16#00#, 16#01#, 16#F0#, 16#00#,
16#00#, 16#00#, 16#F8#, 16#00#, 16#00#, 16#00#, 16#3E#, 16#00#, 16#00#,
16#00#, 16#1F#, 16#00#, 16#00#, 16#00#, 16#07#, 16#C0#, 16#00#, 16#00#,
16#03#, 16#E0#, 16#00#, 16#00#, 16#01#, 16#F8#, 16#00#, 16#00#, 16#00#,
16#7C#, 16#00#, 16#00#, 16#00#, 16#3E#, 16#00#, 16#00#, 16#00#, 16#0F#,
16#80#, 16#00#, 16#00#, 16#07#, 16#C0#, 16#00#, 16#00#, 16#01#, 16#F0#,
16#00#, 16#00#, 16#00#, 16#F8#, 16#00#, 16#00#, 16#00#, 16#3E#, 16#00#,
16#00#, 16#00#, 16#1F#, 16#00#, 16#00#, 16#00#, 16#07#, 16#C0#, 16#00#,
16#00#, 16#03#, 16#E0#, 16#00#, 16#00#, 16#00#, 16#F8#, 16#00#, 16#00#,
16#00#, 16#7C#, 16#00#, 16#00#, 16#00#, 16#3F#, 16#00#, 16#00#, 16#00#,
16#0F#, 16#80#, 16#00#, 16#00#, 16#03#, 16#C0#, 16#00#, 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#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#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#C0#, 16#00#, 16#00#,
16#3F#, 16#FC#, 16#00#, 16#00#, 16#1F#, 16#FF#, 16#80#, 16#00#, 16#0F#,
16#FF#, 16#F0#, 16#00#, 16#07#, 16#FF#, 16#FC#, 16#00#, 16#03#, 16#F8#,
16#3F#, 16#00#, 16#00#, 16#F8#, 16#07#, 16#E0#, 16#00#, 16#7C#, 16#00#,
16#F8#, 16#00#, 16#1F#, 16#00#, 16#3C#, 16#00#, 16#07#, 16#80#, 16#0F#,
16#00#, 16#01#, 16#E0#, 16#07#, 16#C0#, 16#00#, 16#7C#, 16#03#, 16#E0#,
16#00#, 16#1F#, 16#83#, 16#F0#, 16#00#, 16#03#, 16#FF#, 16#F8#, 16#00#,
16#00#, 16#7F#, 16#FC#, 16#00#, 16#00#, 16#1F#, 16#FE#, 16#00#, 16#00#,
16#0F#, 16#FF#, 16#C0#, 16#00#, 16#0F#, 16#FF#, 16#F8#, 16#00#, 16#07#,
16#F0#, 16#7F#, 16#00#, 16#01#, 16#F0#, 16#07#, 16#C0#, 16#00#, 16#F8#,
16#01#, 16#F0#, 16#00#, 16#3C#, 16#00#, 16#7C#, 16#00#, 16#1F#, 16#00#,
16#1F#, 16#00#, 16#07#, 16#C0#, 16#07#, 16#C0#, 16#01#, 16#F8#, 16#03#,
16#E0#, 16#00#, 16#7F#, 16#03#, 16#F8#, 16#00#, 16#0F#, 16#FF#, 16#FC#,
16#00#, 16#03#, 16#FF#, 16#FE#, 16#00#, 16#00#, 16#7F#, 16#FF#, 16#00#,
16#00#, 16#0F#, 16#FF#, 16#00#, 16#00#, 16#00#, 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#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#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#C0#,
16#00#, 16#00#, 16#1F#, 16#FC#, 16#00#, 16#00#, 16#0F#, 16#FF#, 16#80#,
16#00#, 16#07#, 16#FF#, 16#F0#, 16#00#, 16#03#, 16#FF#, 16#FE#, 16#00#,
16#01#, 16#F8#, 16#3F#, 16#80#, 16#00#, 16#7C#, 16#07#, 16#E0#, 16#00#,
16#3E#, 16#00#, 16#F8#, 16#00#, 16#0F#, 16#80#, 16#3E#, 16#00#, 16#07#,
16#C0#, 16#0F#, 16#80#, 16#01#, 16#F0#, 16#03#, 16#E0#, 16#00#, 16#7C#,
16#01#, 16#F8#, 16#00#, 16#1F#, 16#80#, 16#FE#, 16#00#, 16#07#, 16#F0#,
16#FF#, 16#80#, 16#00#, 16#FF#, 16#FF#, 16#E0#, 16#00#, 16#3F#, 16#FF#,
16#F0#, 16#00#, 16#07#, 16#FF#, 16#7C#, 16#00#, 16#00#, 16#FF#, 16#9F#,
16#00#, 16#00#, 16#0F#, 16#8F#, 16#80#, 16#00#, 16#00#, 16#07#, 16#E0#,
16#00#, 16#00#, 16#01#, 16#F0#, 16#00#, 16#00#, 16#00#, 16#FC#, 16#00#,
16#00#, 16#00#, 16#7E#, 16#00#, 16#00#, 16#00#, 16#3F#, 16#00#, 16#00#,
16#00#, 16#3F#, 16#80#, 16#00#, 16#1C#, 16#3F#, 16#C0#, 16#00#, 16#0F#,
16#FF#, 16#E0#, 16#00#, 16#03#, 16#FF#, 16#F0#, 16#00#, 16#01#, 16#FF#,
16#F8#, 16#00#, 16#00#, 16#3F#, 16#F8#, 16#00#, 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#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#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#00#, 16#07#, 16#E0#, 16#00#,
16#00#, 16#03#, 16#F8#, 16#00#, 16#00#, 16#00#, 16#FE#, 16#00#, 16#00#,
16#00#, 16#3F#, 16#80#, 16#00#, 16#00#, 16#07#, 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#78#, 16#00#,
16#00#, 16#00#, 16#3F#, 16#00#, 16#00#, 16#00#, 16#1F#, 16#C0#, 16#00#,
16#00#, 16#07#, 16#F0#, 16#00#, 16#00#, 16#01#, 16#F8#, 16#00#, 16#00#,
16#00#, 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#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#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#00#, 16#00#, 16#0F#,
16#C0#, 16#00#, 16#00#, 16#07#, 16#F0#, 16#00#, 16#00#, 16#01#, 16#FC#,
16#00#, 16#00#, 16#00#, 16#7F#, 16#00#, 16#00#, 16#00#, 16#0F#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#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#E0#, 16#00#, 16#00#, 16#01#,
16#F0#, 16#00#, 16#00#, 16#00#, 16#FC#, 16#00#, 16#00#, 16#00#, 16#3E#,
16#00#, 16#00#, 16#00#, 16#1F#, 16#00#, 16#00#, 16#00#, 16#07#, 16#C0#,
16#00#, 16#00#, 16#03#, 16#E0#, 16#00#, 16#00#, 16#00#, 16#F0#, 16#00#,
16#00#, 16#00#, 16#78#, 16#00#, 16#00#, 16#00#, 16#1E#, 16#00#, 16#00#,
16#00#, 16#0F#, 16#00#, 16#00#, 16#00#, 16#03#, 16#80#, 16#00#, 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#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#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#00#, 16#00#, 16#3C#,
16#00#, 16#00#, 16#00#, 16#7F#, 16#00#, 16#00#, 16#00#, 16#7F#, 16#C0#,
16#00#, 16#00#, 16#7F#, 16#C0#, 16#00#, 16#00#, 16#7F#, 16#C0#, 16#00#,
16#00#, 16#7F#, 16#C0#, 16#00#, 16#00#, 16#FF#, 16#C0#, 16#00#, 16#00#,
16#FF#, 16#C0#, 16#00#, 16#00#, 16#FF#, 16#C0#, 16#00#, 16#00#, 16#FF#,
16#80#, 16#00#, 16#00#, 16#7F#, 16#F0#, 16#00#, 16#00#, 16#03#, 16#FE#,
16#00#, 16#00#, 16#00#, 16#3F#, 16#E0#, 16#00#, 16#00#, 16#07#, 16#FE#,
16#00#, 16#00#, 16#00#, 16#7F#, 16#C0#, 16#00#, 16#00#, 16#07#, 16#FC#,
16#00#, 16#00#, 16#00#, 16#7F#, 16#C0#, 16#00#, 16#00#, 16#0F#, 16#F8#,
16#00#, 16#00#, 16#00#, 16#FE#, 16#00#, 16#00#, 16#00#, 16#0F#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#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#FF#, 16#F0#, 16#03#, 16#FF#, 16#FF#,
16#FC#, 16#00#, 16#FF#, 16#FF#, 16#FF#, 16#00#, 16#3F#, 16#FF#, 16#FF#,
16#C0#, 16#0F#, 16#FF#, 16#FF#, 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#07#, 16#FF#, 16#FF#, 16#F0#, 16#03#,
16#FF#, 16#FF#, 16#FC#, 16#00#, 16#FF#, 16#FF#, 16#FF#, 16#00#, 16#3F#,
16#FF#, 16#FF#, 16#C0#, 16#0F#, 16#FF#, 16#FF#, 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#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#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#00#, 16#00#, 16#7F#, 16#00#, 16#00#, 16#00#,
16#1F#, 16#E0#, 16#00#, 16#00#, 16#03#, 16#FE#, 16#00#, 16#00#, 16#00#,
16#3F#, 16#E0#, 16#00#, 16#00#, 16#07#, 16#FE#, 16#00#, 16#00#, 16#00#,
16#7F#, 16#E0#, 16#00#, 16#00#, 16#07#, 16#FC#, 16#00#, 16#00#, 16#00#,
16#FF#, 16#C0#, 16#00#, 16#00#, 16#0F#, 16#FC#, 16#00#, 16#00#, 16#03#,
16#FF#, 16#00#, 16#00#, 16#03#, 16#FF#, 16#00#, 16#00#, 16#03#, 16#FF#,
16#00#, 16#00#, 16#03#, 16#FE#, 16#00#, 16#00#, 16#03#, 16#FE#, 16#00#,
16#00#, 16#07#, 16#FE#, 16#00#, 16#00#, 16#07#, 16#FE#, 16#00#, 16#00#,
16#03#, 16#FC#, 16#00#, 16#00#, 16#00#, 16#FC#, 16#00#, 16#00#, 16#00#,
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#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#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#FC#, 16#00#, 16#00#, 16#07#, 16#FF#, 16#C0#, 16#00#, 16#07#,
16#FF#, 16#F8#, 16#00#, 16#03#, 16#FF#, 16#FF#, 16#00#, 16#00#, 16#FF#,
16#FF#, 16#C0#, 16#00#, 16#3F#, 16#03#, 16#F0#, 16#00#, 16#1F#, 16#00#,
16#7E#, 16#00#, 16#07#, 16#C0#, 16#0F#, 16#80#, 16#00#, 16#E0#, 16#03#,
16#E0#, 16#00#, 16#00#, 16#01#, 16#F0#, 16#00#, 16#00#, 16#00#, 16#7C#,
16#00#, 16#00#, 16#00#, 16#7F#, 16#00#, 16#00#, 16#00#, 16#7F#, 16#80#,
16#00#, 16#00#, 16#FF#, 16#C0#, 16#00#, 16#00#, 16#7F#, 16#E0#, 16#00#,
16#00#, 16#1F#, 16#E0#, 16#00#, 16#00#, 16#0F#, 16#E0#, 16#00#, 16#00#,
16#03#, 16#E0#, 16#00#, 16#00#, 16#00#, 16#F0#, 16#00#, 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#78#,
16#00#, 16#00#, 16#00#, 16#3F#, 16#00#, 16#00#, 16#00#, 16#1F#, 16#C0#,
16#00#, 16#00#, 16#07#, 16#F0#, 16#00#, 16#00#, 16#01#, 16#F8#, 16#00#,
16#00#, 16#00#, 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#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#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#E0#,
16#00#, 16#00#, 16#07#, 16#FE#, 16#00#, 16#00#, 16#07#, 16#FF#, 16#C0#,
16#00#, 16#03#, 16#FF#, 16#F8#, 16#00#, 16#01#, 16#F8#, 16#3E#, 16#00#,
16#00#, 16#FC#, 16#07#, 16#80#, 16#00#, 16#3C#, 16#01#, 16#E0#, 16#00#,
16#1E#, 16#00#, 16#38#, 16#00#, 16#07#, 16#80#, 16#1E#, 16#00#, 16#03#,
16#C0#, 16#07#, 16#80#, 16#00#, 16#F0#, 16#0F#, 16#E0#, 16#00#, 16#78#,
16#0F#, 16#F8#, 16#00#, 16#1E#, 16#0F#, 16#FC#, 16#00#, 16#07#, 16#87#,
16#FF#, 16#00#, 16#01#, 16#C3#, 16#F3#, 16#C0#, 16#00#, 16#F0#, 16#F0#,
16#F0#, 16#00#, 16#3C#, 16#78#, 16#3C#, 16#00#, 16#0F#, 16#1C#, 16#0E#,
16#00#, 16#03#, 16#CF#, 16#07#, 16#80#, 16#00#, 16#E3#, 16#C1#, 16#E0#,
16#00#, 16#78#, 16#F0#, 16#78#, 16#00#, 16#1E#, 16#3E#, 16#1C#, 16#00#,
16#07#, 16#87#, 16#FF#, 16#80#, 16#01#, 16#E1#, 16#FF#, 16#E0#, 16#00#,
16#70#, 16#3F#, 16#F8#, 16#00#, 16#1C#, 16#03#, 16#FC#, 16#00#, 16#07#,
16#00#, 16#00#, 16#00#, 16#01#, 16#E0#, 16#00#, 16#00#, 16#00#, 16#78#,
16#00#, 16#00#, 16#00#, 16#1E#, 16#00#, 16#00#, 16#00#, 16#07#, 16#C0#,
16#00#, 16#00#, 16#01#, 16#F8#, 16#0F#, 16#00#, 16#00#, 16#3F#, 16#FF#,
16#C0#, 16#00#, 16#07#, 16#FF#, 16#E0#, 16#00#, 16#00#, 16#FF#, 16#F0#,
16#00#, 16#00#, 16#1F#, 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#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#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#FE#, 16#00#, 16#00#, 16#1F#, 16#FF#, 16#80#, 16#00#, 16#07#, 16#FF#,
16#E0#, 16#00#, 16#01#, 16#FF#, 16#F8#, 16#00#, 16#00#, 16#7F#, 16#FE#,
16#00#, 16#00#, 16#00#, 16#FF#, 16#C0#, 16#00#, 16#00#, 16#7D#, 16#F0#,
16#00#, 16#00#, 16#1E#, 16#7C#, 16#00#, 16#00#, 16#0F#, 16#9F#, 16#00#,
16#00#, 16#07#, 16#C7#, 16#C0#, 16#00#, 16#01#, 16#F1#, 16#F8#, 16#00#,
16#00#, 16#F8#, 16#3E#, 16#00#, 16#00#, 16#7C#, 16#0F#, 16#80#, 16#00#,
16#1F#, 16#03#, 16#E0#, 16#00#, 16#0F#, 16#80#, 16#F8#, 16#00#, 16#07#,
16#FF#, 16#FF#, 16#00#, 16#01#, 16#FF#, 16#FF#, 16#C0#, 16#00#, 16#FF#,
16#FF#, 16#F0#, 16#00#, 16#7F#, 16#FF#, 16#FC#, 16#00#, 16#1F#, 16#FF#,
16#FF#, 16#80#, 16#0F#, 16#C0#, 16#07#, 16#E0#, 16#03#, 16#E0#, 16#00#,
16#F8#, 16#07#, 16#FE#, 16#03#, 16#FF#, 16#83#, 16#FF#, 16#C1#, 16#FF#,
16#F0#, 16#FF#, 16#F0#, 16#7F#, 16#FC#, 16#3F#, 16#FC#, 16#1F#, 16#FE#,
16#0F#, 16#FE#, 16#07#, 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#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#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#FF#, 16#FF#, 16#80#, 16#00#, 16#FF#, 16#FF#, 16#F8#, 16#00#,
16#3F#, 16#FF#, 16#FF#, 16#00#, 16#0F#, 16#FF#, 16#FF#, 16#C0#, 16#03#,
16#FF#, 16#FF#, 16#F8#, 16#00#, 16#1F#, 16#00#, 16#7E#, 16#00#, 16#07#,
16#C0#, 16#0F#, 16#80#, 16#01#, 16#E0#, 16#03#, 16#E0#, 16#00#, 16#F8#,
16#00#, 16#F8#, 16#00#, 16#3E#, 16#00#, 16#7C#, 16#00#, 16#0F#, 16#80#,
16#7F#, 16#00#, 16#03#, 16#FF#, 16#FF#, 16#80#, 16#00#, 16#FF#, 16#FF#,
16#80#, 16#00#, 16#7F#, 16#FF#, 16#F0#, 16#00#, 16#1F#, 16#FF#, 16#FE#,
16#00#, 16#07#, 16#FF#, 16#FF#, 16#C0#, 16#01#, 16#E0#, 16#07#, 16#F0#,
16#00#, 16#F8#, 16#00#, 16#7E#, 16#00#, 16#3E#, 16#00#, 16#0F#, 16#80#,
16#0F#, 16#80#, 16#03#, 16#C0#, 16#03#, 16#C0#, 16#01#, 16#F0#, 16#00#,
16#F0#, 16#00#, 16#FC#, 16#03#, 16#FF#, 16#FF#, 16#FE#, 16#01#, 16#FF#,
16#FF#, 16#FF#, 16#00#, 16#7F#, 16#FF#, 16#FF#, 16#80#, 16#1F#, 16#FF#,
16#FF#, 16#C0#, 16#03#, 16#FF#, 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#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#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#00#, 16#07#, 16#FF#, 16#9C#, 16#00#, 16#03#, 16#FF#,
16#FF#, 16#80#, 16#03#, 16#FF#, 16#FF#, 16#E0#, 16#01#, 16#FF#, 16#FF#,
16#F0#, 16#00#, 16#FF#, 16#03#, 16#FC#, 16#00#, 16#7F#, 16#00#, 16#3F#,
16#00#, 16#1F#, 16#00#, 16#07#, 16#C0#, 16#0F#, 16#80#, 16#01#, 16#F0#,
16#07#, 16#E0#, 16#00#, 16#78#, 16#01#, 16#F0#, 16#00#, 16#1C#, 16#00#,
16#7C#, 16#00#, 16#00#, 16#00#, 16#3E#, 16#00#, 16#00#, 16#00#, 16#0F#,
16#80#, 16#00#, 16#00#, 16#03#, 16#E0#, 16#00#, 16#00#, 16#00#, 16#F0#,
16#00#, 16#00#, 16#00#, 16#3C#, 16#00#, 16#00#, 16#00#, 16#1F#, 16#00#,
16#00#, 16#00#, 16#07#, 16#C0#, 16#00#, 16#00#, 16#01#, 16#F0#, 16#00#,
16#00#, 16#00#, 16#7E#, 16#00#, 16#00#, 16#00#, 16#0F#, 16#80#, 16#01#,
16#E0#, 16#03#, 16#F0#, 16#00#, 16#F8#, 16#00#, 16#FF#, 16#00#, 16#FE#,
16#00#, 16#1F#, 16#FF#, 16#FF#, 16#00#, 16#03#, 16#FF#, 16#FF#, 16#80#,
16#00#, 16#7F#, 16#FF#, 16#C0#, 16#00#, 16#0F#, 16#FF#, 16#C0#, 16#00#,
16#00#, 16#7F#, 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#00#, 16#00#, 16#00#, 16#00#, 16#01#, 16#FF#, 16#FE#, 16#00#, 16#00#,
16#FF#, 16#FF#, 16#E0#, 16#00#, 16#3F#, 16#FF#, 16#FC#, 16#00#, 16#0F#,
16#FF#, 16#FF#, 16#80#, 16#01#, 16#FF#, 16#FF#, 16#F0#, 16#00#, 16#3E#,
16#01#, 16#FC#, 16#00#, 16#0F#, 16#80#, 16#1F#, 16#80#, 16#03#, 16#C0#,
16#07#, 16#E0#, 16#00#, 16#F0#, 16#00#, 16#F8#, 16#00#, 16#7C#, 16#00#,
16#3E#, 16#00#, 16#1F#, 16#00#, 16#0F#, 16#80#, 16#07#, 16#C0#, 16#03#,
16#E0#, 16#01#, 16#E0#, 16#00#, 16#F8#, 16#00#, 16#F8#, 16#00#, 16#3E#,
16#00#, 16#3E#, 16#00#, 16#0F#, 16#80#, 16#0F#, 16#80#, 16#03#, 16#C0#,
16#03#, 16#C0#, 16#01#, 16#F0#, 16#00#, 16#F0#, 16#00#, 16#7C#, 16#00#,
16#7C#, 16#00#, 16#3E#, 16#00#, 16#1F#, 16#00#, 16#1F#, 16#80#, 16#07#,
16#C0#, 16#0F#, 16#C0#, 16#01#, 16#E0#, 16#0F#, 16#E0#, 16#03#, 16#FF#,
16#FF#, 16#F0#, 16#00#, 16#FF#, 16#FF#, 16#F8#, 16#00#, 16#7F#, 16#FF#,
16#FC#, 16#00#, 16#1F#, 16#FF#, 16#FC#, 16#00#, 16#03#, 16#FF#, 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#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#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#FF#, 16#FF#,
16#FC#, 16#00#, 16#FF#, 16#FF#, 16#FF#, 16#00#, 16#7F#, 16#FF#, 16#FF#,
16#C0#, 16#1F#, 16#FF#, 16#FF#, 16#E0#, 16#03#, 16#FF#, 16#FF#, 16#F8#,
16#00#, 16#1E#, 16#00#, 16#3E#, 16#00#, 16#0F#, 16#80#, 16#0F#, 16#80#,
16#03#, 16#E0#, 16#03#, 16#E0#, 16#00#, 16#F8#, 16#78#, 16#F0#, 16#00#,
16#3C#, 16#1E#, 16#38#, 16#00#, 16#0F#, 16#0F#, 16#80#, 16#00#, 16#07#,
16#FF#, 16#E0#, 16#00#, 16#01#, 16#FF#, 16#F0#, 16#00#, 16#00#, 16#7F#,
16#FC#, 16#00#, 16#00#, 16#1F#, 16#FF#, 16#00#, 16#00#, 16#0F#, 16#FF#,
16#C0#, 16#00#, 16#03#, 16#E1#, 16#F0#, 16#00#, 16#00#, 16#F8#, 16#78#,
16#38#, 16#00#, 16#3E#, 16#1C#, 16#1E#, 16#00#, 16#0F#, 16#00#, 16#0F#,
16#80#, 16#07#, 16#C0#, 16#03#, 16#E0#, 16#01#, 16#F0#, 16#00#, 16#F8#,
16#03#, 16#FF#, 16#FF#, 16#FC#, 16#01#, 16#FF#, 16#FF#, 16#FF#, 16#00#,
16#7F#, 16#FF#, 16#FF#, 16#C0#, 16#1F#, 16#FF#, 16#FF#, 16#F0#, 16#07#,
16#FF#, 16#FF#, 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#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#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#FF#, 16#FE#, 16#01#, 16#FF#, 16#FF#, 16#FF#, 16#00#, 16#7F#,
16#FF#, 16#FF#, 16#C0#, 16#1F#, 16#FF#, 16#FF#, 16#F0#, 16#07#, 16#FF#,
16#FF#, 16#FC#, 16#00#, 16#3E#, 16#00#, 16#1F#, 16#00#, 16#0F#, 16#80#,
16#07#, 16#80#, 16#03#, 16#C0#, 16#03#, 16#E0#, 16#00#, 16#F0#, 16#70#,
16#F8#, 16#00#, 16#7C#, 16#3E#, 16#1C#, 16#00#, 16#1F#, 16#0F#, 16#00#,
16#00#, 16#07#, 16#FF#, 16#C0#, 16#00#, 16#01#, 16#FF#, 16#F0#, 16#00#,
16#00#, 16#FF#, 16#FC#, 16#00#, 16#00#, 16#3F#, 16#FE#, 16#00#, 16#00#,
16#0F#, 16#FF#, 16#80#, 16#00#, 16#03#, 16#E3#, 16#E0#, 16#00#, 16#00#,
16#F0#, 16#F8#, 16#00#, 16#00#, 16#7C#, 16#1C#, 16#00#, 16#00#, 16#1F#,
16#00#, 16#00#, 16#00#, 16#07#, 16#C0#, 16#00#, 16#00#, 16#01#, 16#E0#,
16#00#, 16#00#, 16#03#, 16#FF#, 16#F0#, 16#00#, 16#01#, 16#FF#, 16#FE#,
16#00#, 16#00#, 16#FF#, 16#FF#, 16#80#, 16#00#, 16#3F#, 16#FF#, 16#C0#,
16#00#, 16#07#, 16#FF#, 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#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#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#FC#,
16#70#, 16#00#, 16#07#, 16#FF#, 16#DC#, 16#00#, 16#07#, 16#FF#, 16#FF#,
16#00#, 16#03#, 16#FF#, 16#FF#, 16#C0#, 16#01#, 16#FF#, 16#FF#, 16#F0#,
16#00#, 16#FF#, 16#01#, 16#FC#, 16#00#, 16#7E#, 16#00#, 16#3E#, 16#00#,
16#3F#, 16#00#, 16#07#, 16#80#, 16#0F#, 16#80#, 16#01#, 16#C0#, 16#07#,
16#C0#, 16#00#, 16#00#, 16#01#, 16#F0#, 16#00#, 16#00#, 16#00#, 16#F8#,
16#00#, 16#00#, 16#00#, 16#3E#, 16#00#, 16#00#, 16#00#, 16#0F#, 16#80#,
16#00#, 16#00#, 16#03#, 16#C0#, 16#00#, 16#00#, 16#01#, 16#F0#, 16#0F#,
16#FF#, 16#80#, 16#7C#, 16#07#, 16#FF#, 16#E0#, 16#1F#, 16#01#, 16#FF#,
16#F8#, 16#07#, 16#C0#, 16#7F#, 16#FE#, 16#01#, 16#F0#, 16#1F#, 16#FF#,
16#00#, 16#7C#, 16#00#, 16#0F#, 16#80#, 16#1F#, 16#00#, 16#03#, 16#C0#,
16#07#, 16#E0#, 16#01#, 16#F0#, 16#01#, 16#FE#, 16#01#, 16#FC#, 16#00#,
16#3F#, 16#FF#, 16#FF#, 16#00#, 16#07#, 16#FF#, 16#FF#, 16#80#, 16#00#,
16#FF#, 16#FF#, 16#C0#, 16#00#, 16#1F#, 16#FF#, 16#C0#, 16#00#, 16#00#,
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#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#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#87#, 16#FC#, 16#00#, 16#7F#,
16#E3#, 16#FF#, 16#80#, 16#3F#, 16#F8#, 16#FF#, 16#E0#, 16#0F#, 16#FE#,
16#3F#, 16#F0#, 16#01#, 16#FF#, 16#0F#, 16#F8#, 16#00#, 16#3E#, 16#00#,
16#7C#, 16#00#, 16#0F#, 16#80#, 16#1E#, 16#00#, 16#03#, 16#C0#, 16#0F#,
16#80#, 16#00#, 16#F0#, 16#03#, 16#E0#, 16#00#, 16#7C#, 16#00#, 16#F8#,
16#00#, 16#1F#, 16#00#, 16#3E#, 16#00#, 16#07#, 16#FF#, 16#FF#, 16#00#,
16#01#, 16#FF#, 16#FF#, 16#C0#, 16#00#, 16#FF#, 16#FF#, 16#F0#, 16#00#,
16#3F#, 16#FF#, 16#FC#, 16#00#, 16#0F#, 16#FF#, 16#FE#, 16#00#, 16#03#,
16#E0#, 16#07#, 16#80#, 16#00#, 16#F0#, 16#03#, 16#E0#, 16#00#, 16#7C#,
16#00#, 16#F8#, 16#00#, 16#1F#, 16#00#, 16#3E#, 16#00#, 16#07#, 16#C0#,
16#0F#, 16#00#, 16#01#, 16#E0#, 16#07#, 16#C0#, 16#03#, 16#FF#, 16#0F#,
16#FC#, 16#01#, 16#FF#, 16#E7#, 16#FF#, 16#80#, 16#7F#, 16#F9#, 16#FF#,
16#E0#, 16#1F#, 16#FC#, 16#7F#, 16#F0#, 16#07#, 16#FE#, 16#1F#, 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#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 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#FF#, 16#F0#,
16#00#, 16#3F#, 16#FF#, 16#FC#, 16#00#, 16#0F#, 16#FF#, 16#FF#, 16#00#,
16#03#, 16#FF#, 16#FF#, 16#C0#, 16#00#, 16#FF#, 16#FF#, 16#E0#, 16#00#,
16#00#, 16#7C#, 16#00#, 16#00#, 16#00#, 16#1F#, 16#00#, 16#00#, 16#00#,
16#07#, 16#80#, 16#00#, 16#00#, 16#03#, 16#E0#, 16#00#, 16#00#, 16#00#,
16#F8#, 16#00#, 16#00#, 16#00#, 16#3E#, 16#00#, 16#00#, 16#00#, 16#0F#,
16#00#, 16#00#, 16#00#, 16#07#, 16#C0#, 16#00#, 16#00#, 16#01#, 16#F0#,
16#00#, 16#00#, 16#00#, 16#7C#, 16#00#, 16#00#, 16#00#, 16#1F#, 16#00#,
16#00#, 16#00#, 16#07#, 16#80#, 16#00#, 16#00#, 16#03#, 16#E0#, 16#00#,
16#00#, 16#00#, 16#F8#, 16#00#, 16#00#, 16#00#, 16#3E#, 16#00#, 16#00#,
16#00#, 16#0F#, 16#00#, 16#00#, 16#00#, 16#07#, 16#C0#, 16#00#, 16#00#,
16#FF#, 16#FF#, 16#E0#, 16#00#, 16#7F#, 16#FF#, 16#F8#, 16#00#, 16#1F#,
16#FF#, 16#FE#, 16#00#, 16#07#, 16#FF#, 16#FF#, 16#80#, 16#00#, 16#FF#,
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#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#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#FE#, 16#00#, 16#03#, 16#FF#, 16#FF#, 16#80#, 16#00#, 16#FF#,
16#FF#, 16#E0#, 16#00#, 16#3F#, 16#FF#, 16#F8#, 16#00#, 16#07#, 16#FF#,
16#FC#, 16#00#, 16#00#, 16#03#, 16#E0#, 16#00#, 16#00#, 16#00#, 16#F8#,
16#00#, 16#00#, 16#00#, 16#3C#, 16#00#, 16#00#, 16#00#, 16#1F#, 16#00#,
16#00#, 16#00#, 16#07#, 16#C0#, 16#00#, 16#00#, 16#01#, 16#F0#, 16#00#,
16#00#, 16#00#, 16#7C#, 16#00#, 16#00#, 16#00#, 16#1E#, 16#00#, 16#00#,
16#00#, 16#0F#, 16#80#, 16#01#, 16#C0#, 16#03#, 16#E0#, 16#00#, 16#F8#,
16#00#, 16#F8#, 16#00#, 16#3E#, 16#00#, 16#3C#, 16#00#, 16#0F#, 16#00#,
16#1F#, 16#00#, 16#07#, 16#C0#, 16#07#, 16#C0#, 16#01#, 16#F0#, 16#01#,
16#F0#, 16#00#, 16#7C#, 16#00#, 16#F8#, 16#00#, 16#1F#, 16#00#, 16#7E#,
16#00#, 16#07#, 16#F0#, 16#3F#, 16#00#, 16#03#, 16#FF#, 16#FF#, 16#80#,
16#00#, 16#FF#, 16#FF#, 16#E0#, 16#00#, 16#0F#, 16#FF#, 16#E0#, 16#00#,
16#00#, 16#FF#, 16#F0#, 16#00#, 16#00#, 16#0F#, 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#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#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#C3#, 16#FE#, 16#01#, 16#FF#, 16#F1#, 16#FF#, 16#80#,
16#7F#, 16#FC#, 16#FF#, 16#E0#, 16#1F#, 16#FF#, 16#3F#, 16#F8#, 16#07#,
16#FF#, 16#87#, 16#FC#, 16#00#, 16#3E#, 16#03#, 16#F8#, 16#00#, 16#0F#,
16#81#, 16#FC#, 16#00#, 16#03#, 16#C1#, 16#FC#, 16#00#, 16#01#, 16#F0#,
16#FE#, 16#00#, 16#00#, 16#7C#, 16#7E#, 16#00#, 16#00#, 16#1F#, 16#7F#,
16#00#, 16#00#, 16#07#, 16#FF#, 16#00#, 16#00#, 16#01#, 16#FF#, 16#E0#,
16#00#, 16#00#, 16#FF#, 16#FC#, 16#00#, 16#00#, 16#3F#, 16#FF#, 16#80#,
16#00#, 16#0F#, 16#E7#, 16#E0#, 16#00#, 16#03#, 16#E0#, 16#FC#, 16#00#,
16#01#, 16#F0#, 16#3F#, 16#00#, 16#00#, 16#7C#, 16#07#, 16#E0#, 16#00#,
16#1F#, 16#01#, 16#F8#, 16#00#, 16#07#, 16#C0#, 16#3E#, 16#00#, 16#01#,
16#E0#, 16#0F#, 16#C0#, 16#07#, 16#FF#, 16#83#, 16#FE#, 16#03#, 16#FF#,
16#E0#, 16#FF#, 16#C0#, 16#FF#, 16#F8#, 16#1F#, 16#F0#, 16#3F#, 16#FE#,
16#07#, 16#F8#, 16#07#, 16#FF#, 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#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#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#FF#, 16#FC#, 16#00#, 16#00#, 16#FF#, 16#FF#,
16#00#, 16#00#, 16#3F#, 16#FF#, 16#C0#, 16#00#, 16#0F#, 16#FF#, 16#F0#,
16#00#, 16#03#, 16#FF#, 16#F8#, 16#00#, 16#00#, 16#07#, 16#C0#, 16#00#,
16#00#, 16#01#, 16#F0#, 16#00#, 16#00#, 16#00#, 16#78#, 16#00#, 16#00#,
16#00#, 16#3E#, 16#00#, 16#00#, 16#00#, 16#0F#, 16#80#, 16#00#, 16#00#,
16#03#, 16#E0#, 16#00#, 16#00#, 16#00#, 16#F0#, 16#00#, 16#00#, 16#00#,
16#7C#, 16#00#, 16#00#, 16#00#, 16#1F#, 16#00#, 16#00#, 16#00#, 16#07#,
16#C0#, 16#00#, 16#00#, 16#01#, 16#F0#, 16#03#, 16#80#, 16#00#, 16#78#,
16#00#, 16#F0#, 16#00#, 16#3E#, 16#00#, 16#7C#, 16#00#, 16#0F#, 16#80#,
16#1F#, 16#00#, 16#03#, 16#E0#, 16#07#, 16#C0#, 16#00#, 16#F0#, 16#01#,
16#E0#, 16#00#, 16#7C#, 16#00#, 16#F8#, 16#03#, 16#FF#, 16#FF#, 16#FE#,
16#01#, 16#FF#, 16#FF#, 16#FF#, 16#80#, 16#7F#, 16#FF#, 16#FF#, 16#C0#,
16#1F#, 16#FF#, 16#FF#, 16#F0#, 16#03#, 16#FF#, 16#FF#, 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#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#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#FC#, 16#00#, 16#3F#, 16#C1#,
16#FF#, 16#00#, 16#1F#, 16#F0#, 16#7F#, 16#C0#, 16#07#, 16#FC#, 16#1F#,
16#F0#, 16#03#, 16#FE#, 16#01#, 16#FE#, 16#01#, 16#FE#, 16#00#, 16#FF#,
16#80#, 16#7F#, 16#80#, 16#3F#, 16#E0#, 16#3F#, 16#E0#, 16#0F#, 16#F8#,
16#1F#, 16#F8#, 16#03#, 16#FF#, 16#07#, 16#FC#, 16#00#, 16#F7#, 16#C3#,
16#FF#, 16#00#, 16#7D#, 16#F1#, 16#F7#, 16#C0#, 16#1F#, 16#7E#, 16#FD#,
16#F0#, 16#07#, 16#CF#, 16#BE#, 16#78#, 16#01#, 16#F3#, 16#FF#, 16#1E#,
16#00#, 16#78#, 16#FF#, 16#CF#, 16#80#, 16#3E#, 16#3F#, 16#E3#, 16#E0#,
16#0F#, 16#87#, 16#F0#, 16#F8#, 16#03#, 16#E1#, 16#FC#, 16#3C#, 16#00#,
16#F0#, 16#7E#, 16#1F#, 16#00#, 16#7C#, 16#1F#, 16#07#, 16#C0#, 16#1F#,
16#00#, 16#01#, 16#F0#, 16#07#, 16#C0#, 16#00#, 16#7C#, 16#07#, 16#FE#,
16#01#, 16#FF#, 16#83#, 16#FF#, 16#C0#, 16#FF#, 16#F0#, 16#FF#, 16#F0#,
16#7F#, 16#FC#, 16#3F#, 16#FC#, 16#1F#, 16#FE#, 16#0F#, 16#FE#, 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#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#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#FC#, 16#03#,
16#FF#, 16#81#, 16#FF#, 16#81#, 16#FF#, 16#E0#, 16#7F#, 16#E0#, 16#7F#,
16#F8#, 16#1F#, 16#FC#, 16#1F#, 16#FE#, 16#07#, 16#FF#, 16#07#, 16#FF#,
16#00#, 16#3F#, 16#C0#, 16#1F#, 16#00#, 16#0F#, 16#F8#, 16#07#, 16#80#,
16#03#, 16#FE#, 16#03#, 16#E0#, 16#01#, 16#FF#, 16#C0#, 16#F8#, 16#00#,
16#7F#, 16#F0#, 16#3E#, 16#00#, 16#1F#, 16#7E#, 16#0F#, 16#80#, 16#07#,
16#9F#, 16#83#, 16#C0#, 16#01#, 16#E3#, 16#F1#, 16#F0#, 16#00#, 16#F8#,
16#FC#, 16#7C#, 16#00#, 16#3E#, 16#1F#, 16#9F#, 16#00#, 16#0F#, 16#87#,
16#E7#, 16#80#, 16#03#, 16#C0#, 16#FB#, 16#E0#, 16#01#, 16#F0#, 16#3F#,
16#F8#, 16#00#, 16#7C#, 16#07#, 16#FE#, 16#00#, 16#1F#, 16#01#, 16#FF#,
16#80#, 16#07#, 16#80#, 16#7F#, 16#C0#, 16#01#, 16#E0#, 16#0F#, 16#F0#,
16#03#, 16#FF#, 16#83#, 16#FC#, 16#01#, 16#FF#, 16#E0#, 16#7F#, 16#00#,
16#7F#, 16#F8#, 16#1F#, 16#80#, 16#1F#, 16#FE#, 16#03#, 16#E0#, 16#03#,
16#FF#, 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#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#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#07#, 16#FF#, 16#80#, 16#00#, 16#07#, 16#FF#, 16#F0#, 16#00#, 16#03#,
16#FF#, 16#FE#, 16#00#, 16#01#, 16#FF#, 16#FF#, 16#C0#, 16#00#, 16#FE#,
16#07#, 16#F0#, 16#00#, 16#7E#, 16#00#, 16#FE#, 16#00#, 16#3F#, 16#00#,
16#1F#, 16#80#, 16#1F#, 16#80#, 16#03#, 16#E0#, 16#07#, 16#C0#, 16#00#,
16#F8#, 16#03#, 16#E0#, 16#00#, 16#1F#, 16#00#, 16#F8#, 16#00#, 16#07#,
16#C0#, 16#7C#, 16#00#, 16#01#, 16#F0#, 16#1F#, 16#00#, 16#00#, 16#78#,
16#07#, 16#C0#, 16#00#, 16#3E#, 16#01#, 16#E0#, 16#00#, 16#0F#, 16#80#,
16#78#, 16#00#, 16#03#, 16#E0#, 16#1E#, 16#00#, 16#01#, 16#F0#, 16#07#,
16#C0#, 16#00#, 16#7C#, 16#01#, 16#F0#, 16#00#, 16#3E#, 16#00#, 16#7C#,
16#00#, 16#1F#, 16#80#, 16#1F#, 16#80#, 16#0F#, 16#C0#, 16#07#, 16#F0#,
16#07#, 16#E0#, 16#00#, 16#FE#, 16#07#, 16#F8#, 16#00#, 16#3F#, 16#FF#,
16#FC#, 16#00#, 16#07#, 16#FF#, 16#FC#, 16#00#, 16#00#, 16#FF#, 16#FE#,
16#00#, 16#00#, 16#0F#, 16#FE#, 16#00#, 16#00#, 16#00#, 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#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#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#FF#, 16#FF#, 16#00#, 16#00#, 16#FF#, 16#FF#, 16#F0#,
16#00#, 16#3F#, 16#FF#, 16#FE#, 16#00#, 16#0F#, 16#FF#, 16#FF#, 16#C0#,
16#03#, 16#FF#, 16#FF#, 16#F8#, 16#00#, 16#1F#, 16#00#, 16#FE#, 16#00#,
16#07#, 16#C0#, 16#1F#, 16#80#, 16#01#, 16#E0#, 16#03#, 16#E0#, 16#00#,
16#F8#, 16#00#, 16#F8#, 16#00#, 16#3E#, 16#00#, 16#3E#, 16#00#, 16#0F#,
16#80#, 16#1F#, 16#00#, 16#03#, 16#C0#, 16#0F#, 16#C0#, 16#00#, 16#F0#,
16#07#, 16#E0#, 16#00#, 16#7F#, 16#FF#, 16#F8#, 16#00#, 16#1F#, 16#FF#,
16#FC#, 16#00#, 16#07#, 16#FF#, 16#FE#, 16#00#, 16#01#, 16#FF#, 16#FE#,
16#00#, 16#00#, 16#FF#, 16#FC#, 16#00#, 16#00#, 16#3E#, 16#00#, 16#00#,
16#00#, 16#0F#, 16#80#, 16#00#, 16#00#, 16#03#, 16#E0#, 16#00#, 16#00#,
16#00#, 16#F0#, 16#00#, 16#00#, 16#03#, 16#FF#, 16#F8#, 16#00#, 16#01#,
16#FF#, 16#FE#, 16#00#, 16#00#, 16#7F#, 16#FF#, 16#80#, 16#00#, 16#1F#,
16#FF#, 16#E0#, 16#00#, 16#03#, 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#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#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#F0#, 16#00#, 16#00#, 16#07#, 16#FF#, 16#80#, 16#00#, 16#07#,
16#FF#, 16#F0#, 16#00#, 16#03#, 16#FF#, 16#FE#, 16#00#, 16#03#, 16#FF#,
16#FF#, 16#C0#, 16#01#, 16#FE#, 16#07#, 16#F0#, 16#00#, 16#7E#, 16#00#,
16#FE#, 16#00#, 16#3F#, 16#00#, 16#1F#, 16#80#, 16#1F#, 16#80#, 16#03#,
16#E0#, 16#07#, 16#C0#, 16#00#, 16#F8#, 16#03#, 16#E0#, 16#00#, 16#1F#,
16#00#, 16#F0#, 16#00#, 16#07#, 16#C0#, 16#7C#, 16#00#, 16#01#, 16#E0#,
16#1F#, 16#00#, 16#00#, 16#78#, 16#07#, 16#C0#, 16#00#, 16#3E#, 16#01#,
16#E0#, 16#00#, 16#0F#, 16#80#, 16#78#, 16#00#, 16#03#, 16#E0#, 16#1E#,
16#00#, 16#01#, 16#F0#, 16#07#, 16#C0#, 16#00#, 16#FC#, 16#01#, 16#F0#,
16#00#, 16#7E#, 16#00#, 16#7E#, 16#00#, 16#3F#, 16#00#, 16#1F#, 16#C0#,
16#1F#, 16#C0#, 16#03#, 16#F8#, 16#1F#, 16#E0#, 16#00#, 16#FF#, 16#FF#,
16#F0#, 16#00#, 16#1F#, 16#FF#, 16#F0#, 16#00#, 16#03#, 16#FF#, 16#F8#,
16#00#, 16#00#, 16#7F#, 16#F8#, 16#00#, 16#00#, 16#0F#, 16#F8#, 16#00#,
16#00#, 16#07#, 16#C0#, 16#00#, 16#00#, 16#03#, 16#FF#, 16#83#, 16#80#,
16#01#, 16#FF#, 16#FF#, 16#F0#, 16#00#, 16#FF#, 16#FF#, 16#F8#, 16#00#,
16#3F#, 16#FF#, 16#FE#, 16#00#, 16#0F#, 16#FF#, 16#FF#, 16#00#, 16#03#,
16#C0#, 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#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#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#FE#, 16#00#,
16#01#, 16#FF#, 16#FF#, 16#E0#, 16#00#, 16#7F#, 16#FF#, 16#FC#, 16#00#,
16#1F#, 16#FF#, 16#FF#, 16#80#, 16#03#, 16#FF#, 16#FF#, 16#E0#, 16#00#,
16#3E#, 16#01#, 16#FC#, 16#00#, 16#0F#, 16#80#, 16#3F#, 16#00#, 16#03#,
16#C0#, 16#07#, 16#C0#, 16#00#, 16#F0#, 16#01#, 16#F0#, 16#00#, 16#7C#,
16#00#, 16#F8#, 16#00#, 16#1F#, 16#00#, 16#7E#, 16#00#, 16#07#, 16#C0#,
16#7F#, 16#00#, 16#01#, 16#FF#, 16#FF#, 16#80#, 16#00#, 16#FF#, 16#FF#,
16#C0#, 16#00#, 16#3F#, 16#FF#, 16#E0#, 16#00#, 16#0F#, 16#FF#, 16#E0#,
16#00#, 16#03#, 16#FF#, 16#FC#, 16#00#, 16#00#, 16#F0#, 16#3F#, 16#80#,
16#00#, 16#7C#, 16#07#, 16#F0#, 16#00#, 16#1F#, 16#00#, 16#FC#, 16#00#,
16#07#, 16#C0#, 16#3F#, 16#80#, 16#01#, 16#E0#, 16#07#, 16#E0#, 16#03#,
16#FF#, 16#81#, 16#FF#, 16#01#, 16#FF#, 16#E0#, 16#3F#, 16#E0#, 16#FF#,
16#F8#, 16#0F#, 16#F8#, 16#3F#, 16#FE#, 16#01#, 16#FC#, 16#07#, 16#FF#,
16#00#, 16#7E#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#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#E0#, 16#00#, 16#07#,
16#FF#, 16#F8#, 16#00#, 16#03#, 16#FF#, 16#FE#, 16#00#, 16#03#, 16#FF#,
16#FF#, 16#80#, 16#01#, 16#FF#, 16#FF#, 16#E0#, 16#00#, 16#7F#, 16#07#,
16#F8#, 16#00#, 16#3F#, 16#00#, 16#7C#, 16#00#, 16#0F#, 16#80#, 16#1F#,
16#00#, 16#03#, 16#C0#, 16#07#, 16#C0#, 16#01#, 16#F0#, 16#00#, 16#E0#,
16#00#, 16#7E#, 16#00#, 16#00#, 16#00#, 16#0F#, 16#F0#, 16#00#, 16#00#,
16#03#, 16#FF#, 16#C0#, 16#00#, 16#00#, 16#FF#, 16#FE#, 16#00#, 16#00#,
16#0F#, 16#FF#, 16#E0#, 16#00#, 16#01#, 16#FF#, 16#FC#, 16#00#, 16#00#,
16#03#, 16#FF#, 16#00#, 16#00#, 16#00#, 16#1F#, 16#C0#, 16#00#, 16#00#,
16#01#, 16#F8#, 16#00#, 16#70#, 16#00#, 16#3E#, 16#00#, 16#3E#, 16#00#,
16#0F#, 16#00#, 16#0F#, 16#80#, 16#07#, 16#C0#, 16#03#, 16#E0#, 16#03#,
16#F0#, 16#01#, 16#FE#, 16#03#, 16#F8#, 16#00#, 16#7F#, 16#FF#, 16#FE#,
16#00#, 16#1F#, 16#FF#, 16#FF#, 16#00#, 16#07#, 16#FF#, 16#FF#, 16#00#,
16#01#, 16#CF#, 16#FF#, 16#80#, 16#00#, 16#00#, 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#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#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#FF#, 16#FC#, 16#00#, 16#FF#, 16#FF#, 16#FF#, 16#00#,
16#7F#, 16#FF#, 16#FF#, 16#C0#, 16#1F#, 16#FF#, 16#FF#, 16#E0#, 16#07#,
16#FF#, 16#FF#, 16#F8#, 16#01#, 16#F0#, 16#78#, 16#3E#, 16#00#, 16#78#,
16#3E#, 16#0F#, 16#80#, 16#3E#, 16#0F#, 16#83#, 16#E0#, 16#0F#, 16#83#,
16#E0#, 16#F0#, 16#03#, 16#E0#, 16#F0#, 16#7C#, 16#00#, 16#F0#, 16#7C#,
16#1F#, 16#00#, 16#38#, 16#1F#, 16#03#, 16#80#, 16#00#, 16#07#, 16#C0#,
16#00#, 16#00#, 16#01#, 16#E0#, 16#00#, 16#00#, 16#00#, 16#F8#, 16#00#,
16#00#, 16#00#, 16#3E#, 16#00#, 16#00#, 16#00#, 16#0F#, 16#80#, 16#00#,
16#00#, 16#03#, 16#E0#, 16#00#, 16#00#, 16#00#, 16#F0#, 16#00#, 16#00#,
16#00#, 16#7C#, 16#00#, 16#00#, 16#00#, 16#1F#, 16#00#, 16#00#, 16#00#,
16#07#, 16#C0#, 16#00#, 16#00#, 16#7F#, 16#FF#, 16#80#, 16#00#, 16#1F#,
16#FF#, 16#E0#, 16#00#, 16#0F#, 16#FF#, 16#F8#, 16#00#, 16#03#, 16#FF#,
16#FE#, 16#00#, 16#00#, 16#7F#, 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#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#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#07#, 16#FE#, 16#01#, 16#FF#, 16#E3#,
16#FF#, 16#C0#, 16#FF#, 16#F9#, 16#FF#, 16#F0#, 16#3F#, 16#FC#, 16#7F#,
16#F8#, 16#07#, 16#FE#, 16#0F#, 16#FC#, 16#00#, 16#78#, 16#00#, 16#7C#,
16#00#, 16#3E#, 16#00#, 16#1F#, 16#00#, 16#0F#, 16#80#, 16#07#, 16#C0#,
16#03#, 16#E0#, 16#01#, 16#F0#, 16#00#, 16#F0#, 16#00#, 16#78#, 16#00#,
16#3C#, 16#00#, 16#3E#, 16#00#, 16#1F#, 16#00#, 16#0F#, 16#80#, 16#07#,
16#C0#, 16#03#, 16#E0#, 16#01#, 16#F0#, 16#00#, 16#F0#, 16#00#, 16#78#,
16#00#, 16#7C#, 16#00#, 16#3E#, 16#00#, 16#1F#, 16#00#, 16#0F#, 16#80#,
16#07#, 16#C0#, 16#03#, 16#E0#, 16#01#, 16#F0#, 16#00#, 16#F8#, 16#00#,
16#78#, 16#00#, 16#3E#, 16#00#, 16#3E#, 16#00#, 16#0F#, 16#80#, 16#1F#,
16#00#, 16#03#, 16#F0#, 16#0F#, 16#C0#, 16#00#, 16#FE#, 16#0F#, 16#E0#,
16#00#, 16#1F#, 16#FF#, 16#F0#, 16#00#, 16#07#, 16#FF#, 16#F8#, 16#00#,
16#00#, 16#FF#, 16#FC#, 16#00#, 16#00#, 16#1F#, 16#FE#, 16#00#, 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#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#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#FC#, 16#07#, 16#FF#, 16#0F#,
16#FF#, 16#03#, 16#FF#, 16#C3#, 16#FF#, 16#C0#, 16#FF#, 16#F0#, 16#FF#,
16#F0#, 16#3F#, 16#FC#, 16#1F#, 16#F8#, 16#0F#, 16#FE#, 16#01#, 16#F0#,
16#00#, 16#7C#, 16#00#, 16#7C#, 16#00#, 16#3E#, 16#00#, 16#1F#, 16#00#,
16#0F#, 16#80#, 16#07#, 16#E0#, 16#07#, 16#C0#, 16#00#, 16#F8#, 16#03#,
16#E0#, 16#00#, 16#3E#, 16#00#, 16#F8#, 16#00#, 16#0F#, 16#80#, 16#7C#,
16#00#, 16#03#, 16#F0#, 16#3F#, 16#00#, 16#00#, 16#FC#, 16#0F#, 16#80#,
16#00#, 16#1F#, 16#07#, 16#C0#, 16#00#, 16#07#, 16#C3#, 16#F0#, 16#00#,
16#01#, 16#F0#, 16#F8#, 16#00#, 16#00#, 16#7E#, 16#7C#, 16#00#, 16#00#,
16#0F#, 16#BF#, 16#00#, 16#00#, 16#03#, 16#EF#, 16#80#, 16#00#, 16#00#,
16#FF#, 16#C0#, 16#00#, 16#00#, 16#3F#, 16#F0#, 16#00#, 16#00#, 16#0F#,
16#F8#, 16#00#, 16#00#, 16#01#, 16#FC#, 16#00#, 16#00#, 16#00#, 16#7F#,
16#00#, 16#00#, 16#00#, 16#1F#, 16#80#, 16#00#, 16#00#, 16#07#, 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#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#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#FE#, 16#07#,
16#FF#, 16#07#, 16#FF#, 16#83#, 16#FF#, 16#C1#, 16#FF#, 16#E0#, 16#FF#,
16#F0#, 16#7F#, 16#F8#, 16#3F#, 16#FC#, 16#1F#, 16#FC#, 16#0F#, 16#FE#,
16#01#, 16#E0#, 16#00#, 16#1E#, 16#00#, 16#78#, 16#3E#, 16#0F#, 16#80#,
16#3E#, 16#0F#, 16#83#, 16#E0#, 16#0F#, 16#87#, 16#E0#, 16#F0#, 16#03#,
16#E3#, 16#FC#, 16#7C#, 16#00#, 16#F8#, 16#FF#, 16#1F#, 16#00#, 16#3E#,
16#7F#, 16#CF#, 16#80#, 16#0F#, 16#9F#, 16#F3#, 16#E0#, 16#03#, 16#EF#,
16#FC#, 16#F8#, 16#00#, 16#FB#, 16#FF#, 16#7C#, 16#00#, 16#3F#, 16#F7#,
16#DF#, 16#00#, 16#0F#, 16#FD#, 16#F7#, 16#80#, 16#03#, 16#FE#, 16#7F#,
16#E0#, 16#01#, 16#FF#, 16#0F#, 16#F8#, 16#00#, 16#7F#, 16#C3#, 16#FC#,
16#00#, 16#1F#, 16#E0#, 16#FF#, 16#00#, 16#07#, 16#F8#, 16#3F#, 16#C0#,
16#01#, 16#FC#, 16#0F#, 16#E0#, 16#00#, 16#7F#, 16#03#, 16#F8#, 16#00#,
16#1F#, 16#80#, 16#FE#, 16#00#, 16#07#, 16#E0#, 16#3F#, 16#00#, 16#01#,
16#F0#, 16#07#, 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#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#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#FE#, 16#03#, 16#FE#, 16#00#, 16#FF#, 16#C1#, 16#FF#, 16#C0#, 16#7F#,
16#F0#, 16#7F#, 16#F0#, 16#1F#, 16#F8#, 16#1F#, 16#F8#, 16#03#, 16#FC#,
16#03#, 16#FC#, 16#00#, 16#3F#, 16#00#, 16#FC#, 16#00#, 16#0F#, 16#E0#,
16#7E#, 16#00#, 16#01#, 16#F8#, 16#7F#, 16#00#, 16#00#, 16#3F#, 16#3F#,
16#00#, 16#00#, 16#07#, 16#FF#, 16#80#, 16#00#, 16#01#, 16#FF#, 16#C0#,
16#00#, 16#00#, 16#3F#, 16#E0#, 16#00#, 16#00#, 16#07#, 16#F0#, 16#00#,
16#00#, 16#01#, 16#F8#, 16#00#, 16#00#, 16#00#, 16#FF#, 16#00#, 16#00#,
16#00#, 16#7F#, 16#E0#, 16#00#, 16#00#, 16#7F#, 16#F8#, 16#00#, 16#00#,
16#3F#, 16#3F#, 16#00#, 16#00#, 16#1F#, 16#87#, 16#E0#, 16#00#, 16#0F#,
16#C1#, 16#F8#, 16#00#, 16#07#, 16#E0#, 16#3F#, 16#00#, 16#03#, 16#F0#,
16#07#, 16#E0#, 16#07#, 16#FE#, 16#07#, 16#FE#, 16#03#, 16#FF#, 16#83#,
16#FF#, 16#80#, 16#FF#, 16#E0#, 16#FF#, 16#E0#, 16#3F#, 16#F8#, 16#3F#,
16#F8#, 16#07#, 16#FC#, 16#0F#, 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#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#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#FC#, 16#07#, 16#FC#, 16#03#, 16#FF#, 16#03#, 16#FF#,
16#00#, 16#FF#, 16#C0#, 16#FF#, 16#C0#, 16#3F#, 16#F0#, 16#3F#, 16#F0#,
16#07#, 16#F8#, 16#0F#, 16#F8#, 16#00#, 16#7C#, 16#01#, 16#F0#, 16#00#,
16#1F#, 16#80#, 16#F8#, 16#00#, 16#03#, 16#E0#, 16#7C#, 16#00#, 16#00#,
16#FC#, 16#3E#, 16#00#, 16#00#, 16#1F#, 16#1F#, 16#00#, 16#00#, 16#07#,
16#EF#, 16#80#, 16#00#, 16#00#, 16#FF#, 16#C0#, 16#00#, 16#00#, 16#3F#,
16#E0#, 16#00#, 16#00#, 16#07#, 16#F8#, 16#00#, 16#00#, 16#01#, 16#FC#,
16#00#, 16#00#, 16#00#, 16#3E#, 16#00#, 16#00#, 16#00#, 16#0F#, 16#00#,
16#00#, 16#00#, 16#07#, 16#C0#, 16#00#, 16#00#, 16#01#, 16#F0#, 16#00#,
16#00#, 16#00#, 16#7C#, 16#00#, 16#00#, 16#00#, 16#1E#, 16#00#, 16#00#,
16#00#, 16#07#, 16#80#, 16#00#, 16#00#, 16#7F#, 16#FF#, 16#00#, 16#00#,
16#3F#, 16#FF#, 16#E0#, 16#00#, 16#0F#, 16#FF#, 16#F8#, 16#00#, 16#03#,
16#FF#, 16#FC#, 16#00#, 16#00#, 16#FF#, 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#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 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#FF#, 16#F0#, 16#00#, 16#1F#,
16#FF#, 16#FC#, 16#00#, 16#07#, 16#FF#, 16#FF#, 16#00#, 16#01#, 16#FF#,
16#FF#, 16#C0#, 16#00#, 16#FF#, 16#FF#, 16#F0#, 16#00#, 16#3E#, 16#01#,
16#F8#, 16#00#, 16#0F#, 16#80#, 16#FC#, 16#00#, 16#03#, 16#E0#, 16#7E#,
16#00#, 16#00#, 16#F0#, 16#3F#, 16#00#, 16#00#, 16#7C#, 16#1F#, 16#80#,
16#00#, 16#0E#, 16#0F#, 16#C0#, 16#00#, 16#00#, 16#07#, 16#E0#, 16#00#,
16#00#, 16#03#, 16#F0#, 16#00#, 16#00#, 16#03#, 16#F0#, 16#00#, 16#00#,
16#01#, 16#F8#, 16#00#, 16#00#, 16#00#, 16#FC#, 16#00#, 16#00#, 16#00#,
16#7E#, 16#03#, 16#80#, 16#00#, 16#3F#, 16#01#, 16#F0#, 16#00#, 16#1F#,
16#80#, 16#7C#, 16#00#, 16#0F#, 16#C0#, 16#1E#, 16#00#, 16#07#, 16#E0#,
16#0F#, 16#80#, 16#03#, 16#F0#, 16#03#, 16#E0#, 16#01#, 16#FF#, 16#FF#,
16#F8#, 16#00#, 16#7F#, 16#FF#, 16#FE#, 16#00#, 16#1F#, 16#FF#, 16#FF#,
16#00#, 16#07#, 16#FF#, 16#FF#, 16#C0#, 16#01#, 16#FF#, 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#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#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#FC#, 16#00#, 16#00#, 16#03#, 16#FF#,
16#00#, 16#00#, 16#00#, 16#FF#, 16#C0#, 16#00#, 16#00#, 16#7F#, 16#F0#,
16#00#, 16#00#, 16#1F#, 16#F8#, 16#00#, 16#00#, 16#07#, 16#C0#, 16#00#,
16#00#, 16#01#, 16#E0#, 16#00#, 16#00#, 16#00#, 16#F8#, 16#00#, 16#00#,
16#00#, 16#3E#, 16#00#, 16#00#, 16#00#, 16#0F#, 16#80#, 16#00#, 16#00#,
16#03#, 16#E0#, 16#00#, 16#00#, 16#00#, 16#F0#, 16#00#, 16#00#, 16#00#,
16#7C#, 16#00#, 16#00#, 16#00#, 16#1F#, 16#00#, 16#00#, 16#00#, 16#07#,
16#C0#, 16#00#, 16#00#, 16#01#, 16#F0#, 16#00#, 16#00#, 16#00#, 16#78#,
16#00#, 16#00#, 16#00#, 16#3E#, 16#00#, 16#00#, 16#00#, 16#0F#, 16#80#,
16#00#, 16#00#, 16#03#, 16#E0#, 16#00#, 16#00#, 16#00#, 16#F0#, 16#00#,
16#00#, 16#00#, 16#3C#, 16#00#, 16#00#, 16#00#, 16#1F#, 16#00#, 16#00#,
16#00#, 16#07#, 16#C0#, 16#00#, 16#00#, 16#01#, 16#F0#, 16#00#, 16#00#,
16#00#, 16#78#, 16#00#, 16#00#, 16#00#, 16#3E#, 16#00#, 16#00#, 16#00#,
16#0F#, 16#80#, 16#00#, 16#00#, 16#03#, 16#E0#, 16#00#, 16#00#, 16#00#,
16#F8#, 16#00#, 16#00#, 16#00#, 16#3C#, 16#00#, 16#00#, 16#00#, 16#1F#,
16#00#, 16#00#, 16#00#, 16#07#, 16#FE#, 16#00#, 16#00#, 16#01#, 16#FF#,
16#80#, 16#00#, 16#00#, 16#7F#, 16#E0#, 16#00#, 16#00#, 16#1F#, 16#F8#,
16#00#, 16#00#, 16#0F#, 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#C0#, 16#00#, 16#00#, 16#00#, 16#78#, 16#00#, 16#00#, 16#00#,
16#3E#, 16#00#, 16#00#, 16#00#, 16#0F#, 16#80#, 16#00#, 16#00#, 16#01#,
16#F0#, 16#00#, 16#00#, 16#00#, 16#7C#, 16#00#, 16#00#, 16#00#, 16#1F#,
16#00#, 16#00#, 16#00#, 16#07#, 16#C0#, 16#00#, 16#00#, 16#00#, 16#F8#,
16#00#, 16#00#, 16#00#, 16#3E#, 16#00#, 16#00#, 16#00#, 16#0F#, 16#80#,
16#00#, 16#00#, 16#03#, 16#F0#, 16#00#, 16#00#, 16#00#, 16#7C#, 16#00#,
16#00#, 16#00#, 16#1F#, 16#00#, 16#00#, 16#00#, 16#07#, 16#C0#, 16#00#,
16#00#, 16#01#, 16#F8#, 16#00#, 16#00#, 16#00#, 16#3E#, 16#00#, 16#00#,
16#00#, 16#0F#, 16#80#, 16#00#, 16#00#, 16#03#, 16#E0#, 16#00#, 16#00#,
16#00#, 16#FC#, 16#00#, 16#00#, 16#00#, 16#1F#, 16#00#, 16#00#, 16#00#,
16#07#, 16#C0#, 16#00#, 16#00#, 16#01#, 16#F0#, 16#00#, 16#00#, 16#00#,
16#3E#, 16#00#, 16#00#, 16#00#, 16#0F#, 16#80#, 16#00#, 16#00#, 16#03#,
16#E0#, 16#00#, 16#00#, 16#00#, 16#F8#, 16#00#, 16#00#, 16#00#, 16#1F#,
16#00#, 16#00#, 16#00#, 16#07#, 16#C0#, 16#00#, 16#00#, 16#01#, 16#F0#,
16#00#, 16#00#, 16#00#, 16#7C#, 16#00#, 16#00#, 16#00#, 16#0F#, 16#80#,
16#00#, 16#00#, 16#03#, 16#E0#, 16#00#, 16#00#, 16#00#, 16#F8#, 16#00#,
16#00#, 16#00#, 16#3F#, 16#00#, 16#00#, 16#00#, 16#07#, 16#C0#, 16#00#,
16#00#, 16#01#, 16#E0#, 16#00#, 16#00#, 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#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#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#FF#, 16#80#,
16#00#, 16#00#, 16#FF#, 16#C0#, 16#00#, 16#00#, 16#3F#, 16#F0#, 16#00#,
16#00#, 16#0F#, 16#FC#, 16#00#, 16#00#, 16#03#, 16#FF#, 16#00#, 16#00#,
16#00#, 16#07#, 16#C0#, 16#00#, 16#00#, 16#01#, 16#E0#, 16#00#, 16#00#,
16#00#, 16#F8#, 16#00#, 16#00#, 16#00#, 16#3E#, 16#00#, 16#00#, 16#00#,
16#0F#, 16#80#, 16#00#, 16#00#, 16#03#, 16#E0#, 16#00#, 16#00#, 16#00#,
16#F0#, 16#00#, 16#00#, 16#00#, 16#7C#, 16#00#, 16#00#, 16#00#, 16#1F#,
16#00#, 16#00#, 16#00#, 16#07#, 16#C0#, 16#00#, 16#00#, 16#01#, 16#E0#,
16#00#, 16#00#, 16#00#, 16#78#, 16#00#, 16#00#, 16#00#, 16#3E#, 16#00#,
16#00#, 16#00#, 16#0F#, 16#80#, 16#00#, 16#00#, 16#03#, 16#E0#, 16#00#,
16#00#, 16#00#, 16#F0#, 16#00#, 16#00#, 16#00#, 16#7C#, 16#00#, 16#00#,
16#00#, 16#1F#, 16#00#, 16#00#, 16#00#, 16#07#, 16#C0#, 16#00#, 16#00#,
16#01#, 16#F0#, 16#00#, 16#00#, 16#00#, 16#78#, 16#00#, 16#00#, 16#00#,
16#3E#, 16#00#, 16#00#, 16#00#, 16#0F#, 16#80#, 16#00#, 16#00#, 16#03#,
16#E0#, 16#00#, 16#00#, 16#00#, 16#F8#, 16#00#, 16#00#, 16#00#, 16#3C#,
16#00#, 16#00#, 16#00#, 16#1F#, 16#00#, 16#00#, 16#00#, 16#FF#, 16#C0#,
16#00#, 16#00#, 16#7F#, 16#F0#, 16#00#, 16#00#, 16#1F#, 16#F8#, 16#00#,
16#00#, 16#07#, 16#FE#, 16#00#, 16#00#, 16#01#, 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#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#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#00#, 16#01#, 16#C0#, 16#00#, 16#00#, 16#00#,
16#F0#, 16#00#, 16#00#, 16#00#, 16#7E#, 16#00#, 16#00#, 16#00#, 16#3F#,
16#80#, 16#00#, 16#00#, 16#1F#, 16#F0#, 16#00#, 16#00#, 16#0F#, 16#FE#,
16#00#, 16#00#, 16#0F#, 16#FF#, 16#80#, 16#00#, 16#07#, 16#F3#, 16#F0#,
16#00#, 16#03#, 16#F8#, 16#FE#, 16#00#, 16#01#, 16#F8#, 16#1F#, 16#80#,
16#00#, 16#FC#, 16#03#, 16#F0#, 16#00#, 16#3E#, 16#00#, 16#FC#, 16#00#,
16#0F#, 16#00#, 16#1F#, 16#00#, 16#03#, 16#80#, 16#03#, 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#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#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#FF#, 16#FF#, 16#80#, 16#FF#, 16#FF#, 16#FF#, 16#E0#,
16#3F#, 16#FF#, 16#FF#, 16#F8#, 16#0F#, 16#FF#, 16#FF#, 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#00#, 16#00#, 16#00#, 16#01#, 16#E0#, 16#00#, 16#00#, 16#00#, 16#7C#,
16#00#, 16#00#, 16#00#, 16#0F#, 16#80#, 16#00#, 16#00#, 16#01#, 16#F0#,
16#00#, 16#00#, 16#00#, 16#3E#, 16#00#, 16#00#, 16#00#, 16#07#, 16#80#,
16#00#, 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#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#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#FF#, 16#00#, 16#00#, 16#07#, 16#FF#,
16#F0#, 16#00#, 16#03#, 16#FF#, 16#FE#, 16#00#, 16#00#, 16#FF#, 16#FF#,
16#C0#, 16#00#, 16#3F#, 16#FF#, 16#F0#, 16#00#, 16#00#, 16#00#, 16#FC#,
16#00#, 16#00#, 16#00#, 16#1F#, 16#00#, 16#00#, 16#00#, 16#07#, 16#C0#,
16#00#, 16#03#, 16#FF#, 16#F0#, 16#00#, 16#07#, 16#FF#, 16#FC#, 16#00#,
16#07#, 16#FF#, 16#FE#, 16#00#, 16#03#, 16#FF#, 16#FF#, 16#80#, 16#01#,
16#FF#, 16#FF#, 16#E0#, 16#00#, 16#FF#, 16#00#, 16#F8#, 16#00#, 16#3E#,
16#00#, 16#3E#, 16#00#, 16#1F#, 16#00#, 16#1F#, 16#00#, 16#07#, 16#C0#,
16#0F#, 16#C0#, 16#01#, 16#F8#, 16#1F#, 16#FE#, 16#00#, 16#7F#, 16#FF#,
16#FF#, 16#80#, 16#0F#, 16#FF#, 16#FF#, 16#E0#, 16#03#, 16#FF#, 16#FF#,
16#F8#, 16#00#, 16#7F#, 16#FB#, 16#FC#, 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#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 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#00#,
16#00#, 16#00#, 16#3F#, 16#C0#, 16#00#, 16#00#, 16#1F#, 16#F0#, 16#00#,
16#00#, 16#07#, 16#FC#, 16#00#, 16#00#, 16#00#, 16#FE#, 16#00#, 16#00#,
16#00#, 16#07#, 16#80#, 16#00#, 16#00#, 16#03#, 16#E0#, 16#00#, 16#00#,
16#00#, 16#F8#, 16#00#, 16#00#, 16#00#, 16#3E#, 16#3F#, 16#80#, 16#00#,
16#0F#, 16#3F#, 16#FC#, 16#00#, 16#03#, 16#FF#, 16#FF#, 16#80#, 16#01#,
16#FF#, 16#FF#, 16#F0#, 16#00#, 16#7F#, 16#FF#, 16#FC#, 16#00#, 16#1F#,
16#E0#, 16#7F#, 16#80#, 16#07#, 16#F0#, 16#07#, 16#E0#, 16#01#, 16#F0#,
16#00#, 16#F8#, 16#00#, 16#FC#, 16#00#, 16#3E#, 16#00#, 16#3E#, 16#00#,
16#0F#, 16#80#, 16#0F#, 16#80#, 16#03#, 16#E0#, 16#03#, 16#C0#, 16#00#,
16#F8#, 16#01#, 16#F0#, 16#00#, 16#3E#, 16#00#, 16#7C#, 16#00#, 16#1F#,
16#00#, 16#1F#, 16#80#, 16#07#, 16#C0#, 16#07#, 16#E0#, 16#03#, 16#E0#,
16#01#, 16#FC#, 16#01#, 16#F8#, 16#03#, 16#FF#, 16#81#, 16#FC#, 16#01#,
16#FF#, 16#FF#, 16#FF#, 16#00#, 16#FF#, 16#FF#, 16#FF#, 16#80#, 16#3F#,
16#FF#, 16#FF#, 16#80#, 16#07#, 16#F3#, 16#FF#, 16#C0#, 16#00#, 16#00#,
16#3F#, 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#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#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#1C#, 16#00#, 16#01#, 16#FF#, 16#FF#, 16#00#, 16#00#, 16#FF#, 16#FF#,
16#C0#, 16#00#, 16#FF#, 16#FF#, 16#F0#, 16#00#, 16#7F#, 16#FF#, 16#FC#,
16#00#, 16#1F#, 16#C0#, 16#7F#, 16#00#, 16#0F#, 16#C0#, 16#0F#, 16#80#,
16#07#, 16#E0#, 16#01#, 16#E0#, 16#01#, 16#F0#, 16#00#, 16#70#, 16#00#,
16#F8#, 16#00#, 16#00#, 16#00#, 16#3E#, 16#00#, 16#00#, 16#00#, 16#0F#,
16#80#, 16#00#, 16#00#, 16#03#, 16#C0#, 16#00#, 16#00#, 16#01#, 16#F0#,
16#00#, 16#00#, 16#00#, 16#7C#, 16#00#, 16#00#, 16#00#, 16#1F#, 16#80#,
16#00#, 16#00#, 16#03#, 16#F0#, 16#00#, 16#70#, 16#00#, 16#FE#, 16#00#,
16#FE#, 16#00#, 16#3F#, 16#FF#, 16#FF#, 16#00#, 16#07#, 16#FF#, 16#FF#,
16#C0#, 16#00#, 16#FF#, 16#FF#, 16#E0#, 16#00#, 16#1F#, 16#FF#, 16#E0#,
16#00#, 16#00#, 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#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 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#80#, 16#00#, 16#00#, 16#3F#,
16#E0#, 16#00#, 16#00#, 16#0F#, 16#F8#, 16#00#, 16#00#, 16#03#, 16#FC#,
16#00#, 16#00#, 16#00#, 16#7F#, 16#00#, 16#00#, 16#00#, 16#07#, 16#C0#,
16#00#, 16#00#, 16#01#, 16#F0#, 16#00#, 16#00#, 16#00#, 16#7C#, 16#00#,
16#00#, 16#FE#, 16#1E#, 16#00#, 16#01#, 16#FF#, 16#E7#, 16#80#, 16#00#,
16#FF#, 16#FF#, 16#E0#, 16#00#, 16#FF#, 16#FF#, 16#F8#, 16#00#, 16#7F#,
16#FF#, 16#FE#, 16#00#, 16#3F#, 16#C0#, 16#FF#, 16#00#, 16#0F#, 16#C0#,
16#1F#, 16#C0#, 16#07#, 16#E0#, 16#03#, 16#F0#, 16#01#, 16#F0#, 16#00#,
16#FC#, 16#00#, 16#F8#, 16#00#, 16#1F#, 16#00#, 16#3E#, 16#00#, 16#07#,
16#80#, 16#0F#, 16#00#, 16#03#, 16#E0#, 16#03#, 16#C0#, 16#00#, 16#F8#,
16#01#, 16#F0#, 16#00#, 16#3E#, 16#00#, 16#7E#, 16#00#, 16#1F#, 16#80#,
16#0F#, 16#80#, 16#0F#, 16#C0#, 16#03#, 16#F0#, 16#07#, 16#F0#, 16#00#,
16#FE#, 16#07#, 16#FF#, 16#80#, 16#1F#, 16#FF#, 16#FF#, 16#E0#, 16#07#,
16#FF#, 16#FF#, 16#F8#, 16#00#, 16#FF#, 16#FD#, 16#FE#, 16#00#, 16#1F#,
16#FE#, 16#FF#, 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#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#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#00#, 16#00#, 16#00#, 16#FF#, 16#F0#,
16#00#, 16#00#, 16#FF#, 16#FE#, 16#00#, 16#00#, 16#7F#, 16#FF#, 16#C0#,
16#00#, 16#3F#, 16#FF#, 16#F8#, 16#00#, 16#1F#, 16#C0#, 16#FF#, 16#00#,
16#0F#, 16#C0#, 16#0F#, 16#C0#, 16#07#, 16#E0#, 16#01#, 16#F0#, 16#01#,
16#F0#, 16#00#, 16#7C#, 16#00#, 16#FF#, 16#FF#, 16#FF#, 16#00#, 16#3F#,
16#FF#, 16#FF#, 16#C0#, 16#0F#, 16#FF#, 16#FF#, 16#F0#, 16#03#, 16#FF#,
16#FF#, 16#FC#, 16#01#, 16#FF#, 16#FF#, 16#FF#, 16#00#, 16#7C#, 16#00#,
16#00#, 16#00#, 16#0F#, 16#80#, 16#00#, 16#00#, 16#03#, 16#F0#, 16#00#,
16#70#, 16#00#, 16#FF#, 16#01#, 16#FE#, 16#00#, 16#3F#, 16#FF#, 16#FF#,
16#80#, 16#07#, 16#FF#, 16#FF#, 16#C0#, 16#00#, 16#FF#, 16#FF#, 16#F0#,
16#00#, 16#1F#, 16#FF#, 16#F0#, 16#00#, 16#00#, 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#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#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#FF#,
16#00#, 16#00#, 16#03#, 16#FF#, 16#F0#, 16#00#, 16#01#, 16#FF#, 16#FC#,
16#00#, 16#00#, 16#FF#, 16#FF#, 16#00#, 16#00#, 16#7F#, 16#FF#, 16#80#,
16#00#, 16#1F#, 16#00#, 16#00#, 16#00#, 16#0F#, 16#80#, 16#00#, 16#00#,
16#03#, 16#E0#, 16#00#, 16#00#, 16#00#, 16#F8#, 16#00#, 16#00#, 16#07#,
16#FF#, 16#FF#, 16#00#, 16#03#, 16#FF#, 16#FF#, 16#C0#, 16#00#, 16#FF#,
16#FF#, 16#F0#, 16#00#, 16#3F#, 16#FF#, 16#FC#, 16#00#, 16#0F#, 16#FF#,
16#FE#, 16#00#, 16#00#, 16#1E#, 16#00#, 16#00#, 16#00#, 16#0F#, 16#80#,
16#00#, 16#00#, 16#03#, 16#E0#, 16#00#, 16#00#, 16#00#, 16#F8#, 16#00#,
16#00#, 16#00#, 16#3C#, 16#00#, 16#00#, 16#00#, 16#0F#, 16#00#, 16#00#,
16#00#, 16#07#, 16#C0#, 16#00#, 16#00#, 16#01#, 16#F0#, 16#00#, 16#00#,
16#00#, 16#7C#, 16#00#, 16#00#, 16#00#, 16#1E#, 16#00#, 16#00#, 16#00#,
16#0F#, 16#80#, 16#00#, 16#00#, 16#7F#, 16#FF#, 16#F0#, 16#00#, 16#3F#,
16#FF#, 16#FC#, 16#00#, 16#0F#, 16#FF#, 16#FF#, 16#00#, 16#03#, 16#FF#,
16#FF#, 16#C0#, 16#00#, 16#7F#, 16#FF#, 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#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#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#FC#, 16#00#,
16#00#, 16#01#, 16#FF#, 16#DF#, 16#E0#, 16#01#, 16#FF#, 16#FF#, 16#F8#,
16#00#, 16#FF#, 16#FF#, 16#FE#, 16#00#, 16#7F#, 16#FF#, 16#FF#, 16#80#,
16#3F#, 16#83#, 16#FF#, 16#C0#, 16#1F#, 16#80#, 16#3F#, 16#80#, 16#07#,
16#C0#, 16#0F#, 16#E0#, 16#03#, 16#E0#, 16#01#, 16#F0#, 16#00#, 16#F8#,
16#00#, 16#7C#, 16#00#, 16#7C#, 16#00#, 16#1F#, 16#00#, 16#1F#, 16#00#,
16#07#, 16#C0#, 16#07#, 16#C0#, 16#01#, 16#E0#, 16#01#, 16#F0#, 16#00#,
16#F8#, 16#00#, 16#7C#, 16#00#, 16#3E#, 16#00#, 16#1F#, 16#00#, 16#1F#,
16#80#, 16#07#, 16#E0#, 16#0F#, 16#E0#, 16#00#, 16#FE#, 16#0F#, 16#F0#,
16#00#, 16#3F#, 16#FF#, 16#FC#, 16#00#, 16#07#, 16#FF#, 16#FF#, 16#00#,
16#01#, 16#FF#, 16#FF#, 16#C0#, 16#00#, 16#1F#, 16#FD#, 16#F0#, 16#00#,
16#01#, 16#F8#, 16#78#, 16#00#, 16#00#, 16#00#, 16#3E#, 16#00#, 16#00#,
16#00#, 16#1F#, 16#80#, 16#00#, 16#00#, 16#0F#, 16#C0#, 16#00#, 16#0F#,
16#FF#, 16#E0#, 16#00#, 16#07#, 16#FF#, 16#F8#, 16#00#, 16#01#, 16#FF#,
16#FC#, 16#00#, 16#00#, 16#7F#, 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#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#3F#, 16#80#, 16#00#, 16#00#, 16#1F#, 16#E0#, 16#00#, 16#00#,
16#0F#, 16#F8#, 16#00#, 16#00#, 16#03#, 16#FE#, 16#00#, 16#00#, 16#00#,
16#7F#, 16#00#, 16#00#, 16#00#, 16#03#, 16#C0#, 16#00#, 16#00#, 16#01#,
16#F0#, 16#00#, 16#00#, 16#00#, 16#7C#, 16#00#, 16#00#, 16#00#, 16#1F#,
16#1F#, 16#80#, 16#00#, 16#07#, 16#9F#, 16#F8#, 16#00#, 16#01#, 16#EF#,
16#FF#, 16#00#, 16#00#, 16#FF#, 16#FF#, 16#C0#, 16#00#, 16#3F#, 16#FF#,
16#F8#, 16#00#, 16#0F#, 16#F0#, 16#7E#, 16#00#, 16#03#, 16#F0#, 16#0F#,
16#80#, 16#01#, 16#F8#, 16#03#, 16#E0#, 16#00#, 16#7C#, 16#00#, 16#F8#,
16#00#, 16#1F#, 16#00#, 16#3E#, 16#00#, 16#07#, 16#C0#, 16#0F#, 16#00#,
16#01#, 16#E0#, 16#07#, 16#C0#, 16#00#, 16#F8#, 16#01#, 16#F0#, 16#00#,
16#3E#, 16#00#, 16#7C#, 16#00#, 16#0F#, 16#80#, 16#1E#, 16#00#, 16#03#,
16#E0#, 16#07#, 16#80#, 16#00#, 16#F0#, 16#03#, 16#E0#, 16#01#, 16#FF#,
16#83#, 16#FE#, 16#00#, 16#FF#, 16#E1#, 16#FF#, 16#C0#, 16#3F#, 16#F8#,
16#FF#, 16#F0#, 16#0F#, 16#FE#, 16#3F#, 16#F8#, 16#03#, 16#FF#, 16#07#,
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#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#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#C0#, 16#00#, 16#00#, 16#03#, 16#F0#, 16#00#, 16#00#, 16#00#, 16#FC#,
16#00#, 16#00#, 16#00#, 16#3E#, 16#00#, 16#00#, 16#00#, 16#0F#, 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#03#, 16#FF#, 16#80#, 16#00#,
16#01#, 16#FF#, 16#E0#, 16#00#, 16#00#, 16#7F#, 16#F0#, 16#00#, 16#00#,
16#1F#, 16#FC#, 16#00#, 16#00#, 16#07#, 16#FF#, 16#00#, 16#00#, 16#00#,
16#07#, 16#C0#, 16#00#, 16#00#, 16#01#, 16#E0#, 16#00#, 16#00#, 16#00#,
16#78#, 16#00#, 16#00#, 16#00#, 16#3E#, 16#00#, 16#00#, 16#00#, 16#0F#,
16#80#, 16#00#, 16#00#, 16#03#, 16#E0#, 16#00#, 16#00#, 16#00#, 16#F0#,
16#00#, 16#00#, 16#00#, 16#3C#, 16#00#, 16#00#, 16#00#, 16#1F#, 16#00#,
16#00#, 16#00#, 16#07#, 16#C0#, 16#00#, 16#00#, 16#01#, 16#F0#, 16#00#,
16#00#, 16#7F#, 16#FF#, 16#F8#, 16#00#, 16#3F#, 16#FF#, 16#FF#, 16#00#,
16#1F#, 16#FF#, 16#FF#, 16#C0#, 16#07#, 16#FF#, 16#FF#, 16#E0#, 16#00#,
16#FF#, 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#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#F8#, 16#00#, 16#00#, 16#00#, 16#3E#, 16#00#, 16#00#,
16#00#, 16#1F#, 16#80#, 16#00#, 16#00#, 16#07#, 16#E0#, 16#00#, 16#00#,
16#01#, 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#03#, 16#FF#,
16#FC#, 16#00#, 16#01#, 16#FF#, 16#FF#, 16#00#, 16#00#, 16#7F#, 16#FF#,
16#C0#, 16#00#, 16#1F#, 16#FF#, 16#F0#, 16#00#, 16#07#, 16#FF#, 16#F8#,
16#00#, 16#00#, 16#00#, 16#1E#, 16#00#, 16#00#, 16#00#, 16#0F#, 16#80#,
16#00#, 16#00#, 16#03#, 16#E0#, 16#00#, 16#00#, 16#00#, 16#F8#, 16#00#,
16#00#, 16#00#, 16#3C#, 16#00#, 16#00#, 16#00#, 16#0F#, 16#00#, 16#00#,
16#00#, 16#07#, 16#C0#, 16#00#, 16#00#, 16#01#, 16#F0#, 16#00#, 16#00#,
16#00#, 16#7C#, 16#00#, 16#00#, 16#00#, 16#1E#, 16#00#, 16#00#, 16#00#,
16#0F#, 16#80#, 16#00#, 16#00#, 16#03#, 16#E0#, 16#00#, 16#00#, 16#00#,
16#F8#, 16#00#, 16#00#, 16#00#, 16#3E#, 16#00#, 16#00#, 16#00#, 16#0F#,
16#00#, 16#00#, 16#00#, 16#07#, 16#C0#, 16#00#, 16#00#, 16#01#, 16#F0#,
16#00#, 16#00#, 16#00#, 16#7C#, 16#00#, 16#00#, 16#00#, 16#3E#, 16#00#,
16#00#, 16#00#, 16#1F#, 16#80#, 16#00#, 16#3F#, 16#FF#, 16#C0#, 16#00#,
16#1F#, 16#FF#, 16#E0#, 16#00#, 16#07#, 16#FF#, 16#F0#, 16#00#, 16#01#,
16#FF#, 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#1F#, 16#C0#,
16#00#, 16#00#, 16#0F#, 16#F0#, 16#00#, 16#00#, 16#07#, 16#FC#, 16#00#,
16#00#, 16#01#, 16#FF#, 16#00#, 16#00#, 16#00#, 16#3F#, 16#80#, 16#00#,
16#00#, 16#01#, 16#E0#, 16#00#, 16#00#, 16#00#, 16#F8#, 16#00#, 16#00#,
16#00#, 16#3E#, 16#00#, 16#00#, 16#00#, 16#0F#, 16#80#, 16#00#, 16#00#,
16#03#, 16#C3#, 16#FF#, 16#00#, 16#01#, 16#F1#, 16#FF#, 16#C0#, 16#00#,
16#7C#, 16#7F#, 16#F0#, 16#00#, 16#1F#, 16#1F#, 16#FC#, 16#00#, 16#07#,
16#C7#, 16#FE#, 16#00#, 16#01#, 16#E3#, 16#F8#, 16#00#, 16#00#, 16#FB#,
16#F8#, 16#00#, 16#00#, 16#3F#, 16#FC#, 16#00#, 16#00#, 16#0F#, 16#FC#,
16#00#, 16#00#, 16#03#, 16#FE#, 16#00#, 16#00#, 16#00#, 16#FF#, 16#C0#,
16#00#, 16#00#, 16#7F#, 16#F8#, 16#00#, 16#00#, 16#1F#, 16#FF#, 16#00#,
16#00#, 16#07#, 16#CF#, 16#E0#, 16#00#, 16#01#, 16#E1#, 16#FC#, 16#00#,
16#00#, 16#F8#, 16#3F#, 16#80#, 16#01#, 16#FE#, 16#0F#, 16#FE#, 16#00#,
16#FF#, 16#83#, 16#FF#, 16#80#, 16#3F#, 16#E1#, 16#FF#, 16#E0#, 16#0F#,
16#F0#, 16#7F#, 16#F8#, 16#01#, 16#FC#, 16#0F#, 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#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#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#80#, 16#00#, 16#01#, 16#FF#, 16#C0#, 16#00#, 16#00#,
16#7F#, 16#F0#, 16#00#, 16#00#, 16#1F#, 16#FC#, 16#00#, 16#00#, 16#07#,
16#FF#, 16#00#, 16#00#, 16#00#, 16#07#, 16#C0#, 16#00#, 16#00#, 16#01#,
16#E0#, 16#00#, 16#00#, 16#00#, 16#F8#, 16#00#, 16#00#, 16#00#, 16#3E#,
16#00#, 16#00#, 16#00#, 16#0F#, 16#80#, 16#00#, 16#00#, 16#03#, 16#E0#,
16#00#, 16#00#, 16#00#, 16#F0#, 16#00#, 16#00#, 16#00#, 16#7C#, 16#00#,
16#00#, 16#00#, 16#1F#, 16#00#, 16#00#, 16#00#, 16#07#, 16#C0#, 16#00#,
16#00#, 16#01#, 16#E0#, 16#00#, 16#00#, 16#00#, 16#78#, 16#00#, 16#00#,
16#00#, 16#3E#, 16#00#, 16#00#, 16#00#, 16#0F#, 16#80#, 16#00#, 16#00#,
16#03#, 16#E0#, 16#00#, 16#00#, 16#00#, 16#F0#, 16#00#, 16#00#, 16#00#,
16#3C#, 16#00#, 16#00#, 16#00#, 16#1F#, 16#00#, 16#00#, 16#00#, 16#07#,
16#C0#, 16#00#, 16#00#, 16#01#, 16#F0#, 16#00#, 16#00#, 16#7F#, 16#FF#,
16#F8#, 16#00#, 16#3F#, 16#FF#, 16#FF#, 16#00#, 16#1F#, 16#FF#, 16#FF#,
16#C0#, 16#07#, 16#FF#, 16#FF#, 16#E0#, 16#00#, 16#FF#, 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#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#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#F8#, 16#00#, 16#FE#, 16#FE#, 16#7F#, 16#00#, 16#7F#,
16#FF#, 16#BF#, 16#E0#, 16#1F#, 16#FF#, 16#FF#, 16#FC#, 16#07#, 16#FF#,
16#FF#, 16#FF#, 16#01#, 16#FF#, 16#1F#, 16#C7#, 16#C0#, 16#1F#, 16#87#,
16#E1#, 16#F0#, 16#07#, 16#C1#, 16#F0#, 16#78#, 16#01#, 16#F0#, 16#78#,
16#1E#, 16#00#, 16#78#, 16#3E#, 16#0F#, 16#80#, 16#3E#, 16#0F#, 16#83#,
16#E0#, 16#0F#, 16#83#, 16#E0#, 16#F8#, 16#03#, 16#E0#, 16#F8#, 16#3C#,
16#00#, 16#F0#, 16#3C#, 16#0F#, 16#00#, 16#7C#, 16#1F#, 16#07#, 16#C0#,
16#1F#, 16#07#, 16#C1#, 16#F0#, 16#07#, 16#C1#, 16#F0#, 16#7C#, 16#07#,
16#F8#, 16#7E#, 16#1F#, 16#83#, 16#FF#, 16#1F#, 16#CF#, 16#F0#, 16#FF#,
16#CF#, 16#F3#, 16#FC#, 16#3F#, 16#F3#, 16#FC#, 16#FE#, 16#0F#, 16#F8#,
16#FE#, 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#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#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#80#, 16#00#, 16#1F#, 16#9F#, 16#F8#,
16#00#, 16#0F#, 16#EF#, 16#FF#, 16#00#, 16#07#, 16#FF#, 16#FF#, 16#C0#,
16#01#, 16#FF#, 16#FF#, 16#F8#, 16#00#, 16#3F#, 16#F0#, 16#7E#, 16#00#,
16#03#, 16#F0#, 16#0F#, 16#80#, 16#00#, 16#F8#, 16#03#, 16#E0#, 16#00#,
16#7C#, 16#00#, 16#F8#, 16#00#, 16#1F#, 16#00#, 16#3E#, 16#00#, 16#07#,
16#C0#, 16#0F#, 16#00#, 16#01#, 16#E0#, 16#07#, 16#C0#, 16#00#, 16#F8#,
16#01#, 16#F0#, 16#00#, 16#3E#, 16#00#, 16#7C#, 16#00#, 16#0F#, 16#80#,
16#1F#, 16#00#, 16#03#, 16#E0#, 16#07#, 16#80#, 16#00#, 16#F0#, 16#03#,
16#E0#, 16#01#, 16#FF#, 16#83#, 16#FE#, 16#00#, 16#FF#, 16#E1#, 16#FF#,
16#80#, 16#3F#, 16#F8#, 16#7F#, 16#E0#, 16#0F#, 16#FE#, 16#1F#, 16#F8#,
16#03#, 16#FF#, 16#07#, 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#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#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#00#, 16#00#, 16#00#,
16#FF#, 16#F0#, 16#00#, 16#00#, 16#FF#, 16#FE#, 16#00#, 16#00#, 16#7F#,
16#FF#, 16#C0#, 16#00#, 16#3F#, 16#FF#, 16#F8#, 16#00#, 16#1F#, 16#C0#,
16#FE#, 16#00#, 16#0F#, 16#C0#, 16#0F#, 16#C0#, 16#07#, 16#E0#, 16#01#,
16#F0#, 16#01#, 16#F0#, 16#00#, 16#7C#, 16#00#, 16#F8#, 16#00#, 16#1F#,
16#00#, 16#3E#, 16#00#, 16#07#, 16#C0#, 16#0F#, 16#00#, 16#01#, 16#F0#,
16#03#, 16#C0#, 16#00#, 16#7C#, 16#01#, 16#F0#, 16#00#, 16#1E#, 16#00#,
16#3E#, 16#00#, 16#0F#, 16#80#, 16#0F#, 16#80#, 16#07#, 16#C0#, 16#03#,
16#F0#, 16#03#, 16#F0#, 16#00#, 16#FF#, 16#03#, 16#F8#, 16#00#, 16#1F#,
16#FF#, 16#FC#, 16#00#, 16#07#, 16#FF#, 16#FE#, 16#00#, 16#00#, 16#FF#,
16#FF#, 16#00#, 16#00#, 16#0F#, 16#FF#, 16#00#, 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#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#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#80#,
16#00#, 16#7F#, 16#3F#, 16#F8#, 16#00#, 16#3F#, 16#DF#, 16#FF#, 16#80#,
16#1F#, 16#FF#, 16#FF#, 16#F0#, 16#03#, 16#FF#, 16#FF#, 16#FC#, 16#00#,
16#FF#, 16#E0#, 16#7F#, 16#80#, 16#07#, 16#E0#, 16#07#, 16#E0#, 16#01#,
16#F0#, 16#00#, 16#F8#, 16#00#, 16#FC#, 16#00#, 16#3E#, 16#00#, 16#3E#,
16#00#, 16#0F#, 16#80#, 16#0F#, 16#80#, 16#03#, 16#E0#, 16#03#, 16#C0#,
16#00#, 16#F8#, 16#01#, 16#F0#, 16#00#, 16#3E#, 16#00#, 16#7E#, 16#00#,
16#1F#, 16#80#, 16#1F#, 16#80#, 16#07#, 16#C0#, 16#07#, 16#F0#, 16#03#,
16#F0#, 16#01#, 16#FE#, 16#07#, 16#F8#, 16#00#, 16#FF#, 16#FF#, 16#FC#,
16#00#, 16#3F#, 16#FF#, 16#FE#, 16#00#, 16#0F#, 16#FF#, 16#FF#, 16#00#,
16#03#, 16#EF#, 16#FF#, 16#00#, 16#01#, 16#F0#, 16#FE#, 16#00#, 16#00#,
16#7C#, 16#00#, 16#00#, 16#00#, 16#1F#, 16#00#, 16#00#, 16#00#, 16#07#,
16#C0#, 16#00#, 16#00#, 16#01#, 16#E0#, 16#00#, 16#00#, 16#03#, 16#FF#,
16#C0#, 16#00#, 16#00#, 16#FF#, 16#F8#, 16#00#, 16#00#, 16#3F#, 16#FE#,
16#00#, 16#00#, 16#0F#, 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#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#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#00#, 16#03#, 16#FF#, 16#9F#, 16#E0#, 16#03#, 16#FF#,
16#F7#, 16#F8#, 16#01#, 16#FF#, 16#FF#, 16#FE#, 16#00#, 16#FF#, 16#FF#,
16#FF#, 16#80#, 16#7F#, 16#03#, 16#FF#, 16#C0#, 16#3F#, 16#00#, 16#3F#,
16#80#, 16#0F#, 16#80#, 16#07#, 16#E0#, 16#07#, 16#C0#, 16#01#, 16#F0#,
16#01#, 16#F0#, 16#00#, 16#7C#, 16#00#, 16#78#, 16#00#, 16#1F#, 16#00#,
16#3E#, 16#00#, 16#07#, 16#C0#, 16#0F#, 16#80#, 16#01#, 16#E0#, 16#03#,
16#E0#, 16#00#, 16#F8#, 16#00#, 16#FC#, 16#00#, 16#7E#, 16#00#, 16#3F#,
16#00#, 16#3F#, 16#80#, 16#07#, 16#F0#, 16#3F#, 16#E0#, 16#01#, 16#FF#,
16#FF#, 16#F0#, 16#00#, 16#3F#, 16#FF#, 16#FC#, 16#00#, 16#07#, 16#FF#,
16#FF#, 16#00#, 16#00#, 16#FF#, 16#E7#, 16#C0#, 16#00#, 16#0F#, 16#E1#,
16#F0#, 16#00#, 16#00#, 16#00#, 16#78#, 16#00#, 16#00#, 16#00#, 16#3E#,
16#00#, 16#00#, 16#00#, 16#0F#, 16#80#, 16#00#, 16#00#, 16#03#, 16#E0#,
16#00#, 16#00#, 16#1F#, 16#FE#, 16#00#, 16#00#, 16#0F#, 16#FF#, 16#C0#,
16#00#, 16#07#, 16#FF#, 16#F0#, 16#00#, 16#01#, 16#FF#, 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#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#F8#, 16#00#, 16#0F#, 16#F0#, 16#FF#, 16#80#,
16#07#, 16#FC#, 16#FF#, 16#E0#, 16#01#, 16#FF#, 16#7F#, 16#FC#, 16#00#,
16#7F#, 16#FF#, 16#FE#, 16#00#, 16#1F#, 16#FF#, 16#C7#, 16#00#, 16#00#,
16#7F#, 16#C0#, 16#00#, 16#00#, 16#3F#, 16#C0#, 16#00#, 16#00#, 16#0F#,
16#E0#, 16#00#, 16#00#, 16#03#, 16#F0#, 16#00#, 16#00#, 16#00#, 16#F8#,
16#00#, 16#00#, 16#00#, 16#3C#, 16#00#, 16#00#, 16#00#, 16#1F#, 16#00#,
16#00#, 16#00#, 16#07#, 16#C0#, 16#00#, 16#00#, 16#01#, 16#F0#, 16#00#,
16#00#, 16#00#, 16#7C#, 16#00#, 16#00#, 16#00#, 16#1E#, 16#00#, 16#00#,
16#01#, 16#FF#, 16#FF#, 16#C0#, 16#00#, 16#FF#, 16#FF#, 16#F0#, 16#00#,
16#3F#, 16#FF#, 16#FC#, 16#00#, 16#0F#, 16#FF#, 16#FF#, 16#00#, 16#01#,
16#FF#, 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#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 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#18#, 16#00#, 16#00#, 16#FF#,
16#FF#, 16#00#, 16#00#, 16#FF#, 16#FF#, 16#C0#, 16#00#, 16#7F#, 16#FF#,
16#F0#, 16#00#, 16#3F#, 16#FF#, 16#F8#, 16#00#, 16#0F#, 16#E0#, 16#7E#,
16#00#, 16#07#, 16#E0#, 16#07#, 16#00#, 16#01#, 16#F8#, 16#00#, 16#00#,
16#00#, 16#7F#, 16#E0#, 16#00#, 16#00#, 16#0F#, 16#FF#, 16#C0#, 16#00#,
16#03#, 16#FF#, 16#FC#, 16#00#, 16#00#, 16#7F#, 16#FF#, 16#80#, 16#00#,
16#07#, 16#FF#, 16#F0#, 16#00#, 16#00#, 16#0F#, 16#FC#, 16#00#, 16#00#,
16#00#, 16#3F#, 16#00#, 16#03#, 16#80#, 16#07#, 16#C0#, 16#01#, 16#E0#,
16#03#, 16#F0#, 16#00#, 16#FE#, 16#01#, 16#FC#, 16#00#, 16#3F#, 16#FF#,
16#FE#, 16#00#, 16#0F#, 16#FF#, 16#FF#, 16#00#, 16#03#, 16#FF#, 16#FF#,
16#80#, 16#00#, 16#FF#, 16#FF#, 16#80#, 16#00#, 16#00#, 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#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#0E#, 16#00#, 16#00#, 16#00#, 16#07#, 16#C0#, 16#00#,
16#00#, 16#01#, 16#E0#, 16#00#, 16#00#, 16#00#, 16#F8#, 16#00#, 16#00#,
16#00#, 16#3E#, 16#00#, 16#00#, 16#00#, 16#0F#, 16#80#, 16#00#, 16#00#,
16#3F#, 16#FF#, 16#F8#, 16#00#, 16#1F#, 16#FF#, 16#FF#, 16#00#, 16#0F#,
16#FF#, 16#FF#, 16#C0#, 16#03#, 16#FF#, 16#FF#, 16#E0#, 16#00#, 16#7F#,
16#FF#, 16#F0#, 16#00#, 16#01#, 16#E0#, 16#00#, 16#00#, 16#00#, 16#F8#,
16#00#, 16#00#, 16#00#, 16#3E#, 16#00#, 16#00#, 16#00#, 16#0F#, 16#80#,
16#00#, 16#00#, 16#03#, 16#C0#, 16#00#, 16#00#, 16#00#, 16#F0#, 16#00#,
16#00#, 16#00#, 16#7C#, 16#00#, 16#00#, 16#00#, 16#1F#, 16#00#, 16#00#,
16#00#, 16#07#, 16#C0#, 16#00#, 16#00#, 16#01#, 16#E0#, 16#00#, 16#00#,
16#00#, 16#78#, 16#00#, 16#00#, 16#00#, 16#3F#, 16#00#, 16#78#, 16#00#,
16#07#, 16#FF#, 16#FF#, 16#00#, 16#01#, 16#FF#, 16#FF#, 16#80#, 16#00#,
16#7F#, 16#FF#, 16#E0#, 16#00#, 16#0F#, 16#FF#, 16#E0#, 16#00#, 16#00#,
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#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#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#80#, 16#FF#, 16#00#, 16#1F#, 16#E0#, 16#7F#,
16#C0#, 16#0F#, 16#F8#, 16#3F#, 16#F0#, 16#03#, 16#FE#, 16#0F#, 16#FC#,
16#00#, 16#7F#, 16#81#, 16#FE#, 16#00#, 16#03#, 16#C0#, 16#07#, 16#80#,
16#01#, 16#F0#, 16#03#, 16#E0#, 16#00#, 16#7C#, 16#00#, 16#F8#, 16#00#,
16#1F#, 16#00#, 16#3E#, 16#00#, 16#07#, 16#C0#, 16#0F#, 16#00#, 16#01#,
16#E0#, 16#07#, 16#C0#, 16#00#, 16#F8#, 16#01#, 16#F0#, 16#00#, 16#3E#,
16#00#, 16#7C#, 16#00#, 16#0F#, 16#80#, 16#1E#, 16#00#, 16#03#, 16#E0#,
16#0F#, 16#80#, 16#00#, 16#F8#, 16#07#, 16#E0#, 16#00#, 16#3F#, 16#07#,
16#FE#, 16#00#, 16#0F#, 16#FF#, 16#FF#, 16#80#, 16#03#, 16#FF#, 16#FF#,
16#E0#, 16#00#, 16#7F#, 16#FB#, 16#F8#, 16#00#, 16#0F#, 16#FD#, 16#FC#,
16#00#, 16#00#, 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#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#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#E0#, 16#FF#, 16#E0#, 16#7F#,
16#F8#, 16#7F#, 16#F8#, 16#1F#, 16#FE#, 16#1F#, 16#FE#, 16#07#, 16#FF#,
16#87#, 16#FF#, 16#81#, 16#FF#, 16#C1#, 16#FF#, 16#C0#, 16#0F#, 16#C0#,
16#1F#, 16#00#, 16#01#, 16#F0#, 16#07#, 16#C0#, 16#00#, 16#7C#, 16#03#,
16#E0#, 16#00#, 16#1F#, 16#01#, 16#F0#, 16#00#, 16#07#, 16#E0#, 16#FC#,
16#00#, 16#00#, 16#F8#, 16#3E#, 16#00#, 16#00#, 16#3E#, 16#1F#, 16#00#,
16#00#, 16#0F#, 16#CF#, 16#C0#, 16#00#, 16#01#, 16#F3#, 16#E0#, 16#00#,
16#00#, 16#7D#, 16#F0#, 16#00#, 16#00#, 16#1F#, 16#F8#, 16#00#, 16#00#,
16#07#, 16#FE#, 16#00#, 16#00#, 16#00#, 16#FF#, 16#00#, 16#00#, 16#00#,
16#3F#, 16#80#, 16#00#, 16#00#, 16#0F#, 16#E0#, 16#00#, 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#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#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#80#, 16#3F#,
16#E0#, 16#7F#, 16#E0#, 16#1F#, 16#F8#, 16#1F#, 16#F8#, 16#07#, 16#FE#,
16#07#, 16#FE#, 16#01#, 16#FF#, 16#81#, 16#FF#, 16#00#, 16#7F#, 16#C0#,
16#1F#, 16#0F#, 16#87#, 16#C0#, 16#07#, 16#C3#, 16#E1#, 16#F0#, 16#01#,
16#F1#, 16#F8#, 16#F8#, 16#00#, 16#7C#, 16#FE#, 16#3E#, 16#00#, 16#1F#,
16#3F#, 16#DF#, 16#00#, 16#07#, 16#DF#, 16#F7#, 16#C0#, 16#01#, 16#F7#,
16#FF#, 16#E0#, 16#00#, 16#7F#, 16#FF#, 16#F8#, 16#00#, 16#1F#, 16#F7#,
16#FC#, 16#00#, 16#07#, 16#FD#, 16#FF#, 16#00#, 16#01#, 16#FE#, 16#3F#,
16#80#, 16#00#, 16#7F#, 16#8F#, 16#E0#, 16#00#, 16#0F#, 16#C3#, 16#F8#,
16#00#, 16#03#, 16#F0#, 16#FC#, 16#00#, 16#00#, 16#F8#, 16#3F#, 16#00#,
16#00#, 16#3C#, 16#0F#, 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#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#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#F0#, 16#7F#, 16#C0#, 16#0F#, 16#FC#, 16#3F#, 16#F0#, 16#03#, 16#FF#,
16#1F#, 16#FC#, 16#00#, 16#FF#, 16#C7#, 16#FF#, 16#00#, 16#3F#, 16#E0#,
16#FF#, 16#80#, 16#03#, 16#F8#, 16#7F#, 16#00#, 16#00#, 16#7F#, 16#3F#,
16#80#, 16#00#, 16#0F#, 16#FF#, 16#C0#, 16#00#, 16#01#, 16#FF#, 16#C0#,
16#00#, 16#00#, 16#3F#, 16#E0#, 16#00#, 16#00#, 16#0F#, 16#F0#, 16#00#,
16#00#, 16#07#, 16#FE#, 16#00#, 16#00#, 16#07#, 16#FF#, 16#C0#, 16#00#,
16#03#, 16#FB#, 16#F8#, 16#00#, 16#01#, 16#FC#, 16#7F#, 16#00#, 16#00#,
16#FE#, 16#0F#, 16#E0#, 16#01#, 16#FF#, 16#03#, 16#FE#, 16#00#, 16#FF#,
16#E1#, 16#FF#, 16#C0#, 16#7F#, 16#F8#, 16#FF#, 16#F0#, 16#1F#, 16#FE#,
16#3F#, 16#F8#, 16#03#, 16#FF#, 16#07#, 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#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#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#C0#, 16#7F#, 16#C0#, 16#1F#, 16#F8#, 16#3F#, 16#F8#,
16#0F#, 16#FE#, 16#0F#, 16#FE#, 16#03#, 16#FF#, 16#03#, 16#FF#, 16#00#,
16#7F#, 16#80#, 16#7F#, 16#80#, 16#0F#, 16#C0#, 16#0F#, 16#80#, 16#01#,
16#F0#, 16#07#, 16#E0#, 16#00#, 16#7C#, 16#01#, 16#F0#, 16#00#, 16#1F#,
16#80#, 16#F8#, 16#00#, 16#03#, 16#E0#, 16#7C#, 16#00#, 16#00#, 16#F8#,
16#3F#, 16#00#, 16#00#, 16#3E#, 16#0F#, 16#80#, 16#00#, 16#0F#, 16#C7#,
16#C0#, 16#00#, 16#01#, 16#F3#, 16#E0#, 16#00#, 16#00#, 16#7C#, 16#F0#,
16#00#, 16#00#, 16#1F#, 16#FC#, 16#00#, 16#00#, 16#03#, 16#FE#, 16#00#,
16#00#, 16#00#, 16#FF#, 16#00#, 16#00#, 16#00#, 16#3F#, 16#80#, 16#00#,
16#00#, 16#07#, 16#E0#, 16#00#, 16#00#, 16#01#, 16#F0#, 16#00#, 16#00#,
16#00#, 16#F8#, 16#00#, 16#00#, 16#00#, 16#7C#, 16#00#, 16#00#, 16#00#,
16#1F#, 16#00#, 16#00#, 16#00#, 16#0F#, 16#80#, 16#00#, 16#03#, 16#FF#,
16#F8#, 16#00#, 16#00#, 16#FF#, 16#FE#, 16#00#, 16#00#, 16#3F#, 16#FF#,
16#80#, 16#00#, 16#0F#, 16#FF#, 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#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#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#FF#, 16#00#, 16#01#, 16#FF#,
16#FF#, 16#C0#, 16#00#, 16#FF#, 16#FF#, 16#F0#, 16#00#, 16#3F#, 16#FF#,
16#F8#, 16#00#, 16#0F#, 16#FF#, 16#FE#, 16#00#, 16#03#, 16#E0#, 16#7F#,
16#00#, 16#00#, 16#F0#, 16#3F#, 16#00#, 16#00#, 16#38#, 16#3F#, 16#80#,
16#00#, 16#00#, 16#1F#, 16#C0#, 16#00#, 16#00#, 16#0F#, 16#E0#, 16#00#,
16#00#, 16#07#, 16#E0#, 16#00#, 16#00#, 16#07#, 16#F0#, 16#00#, 16#00#,
16#03#, 16#F8#, 16#00#, 16#00#, 16#01#, 16#FC#, 16#00#, 16#00#, 16#00#,
16#FC#, 16#03#, 16#80#, 16#00#, 16#FE#, 16#01#, 16#E0#, 16#00#, 16#7F#,
16#FF#, 16#F8#, 16#00#, 16#1F#, 16#FF#, 16#FE#, 16#00#, 16#0F#, 16#FF#,
16#FF#, 16#80#, 16#03#, 16#FF#, 16#FF#, 16#E0#, 16#00#, 16#FF#, 16#FF#,
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#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#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#00#, 16#00#,
16#FE#, 16#00#, 16#00#, 16#00#, 16#7F#, 16#80#, 16#00#, 16#00#, 16#3F#,
16#E0#, 16#00#, 16#00#, 16#0F#, 16#E0#, 16#00#, 16#00#, 16#07#, 16#E0#,
16#00#, 16#00#, 16#01#, 16#F0#, 16#00#, 16#00#, 16#00#, 16#F8#, 16#00#,
16#00#, 16#00#, 16#3E#, 16#00#, 16#00#, 16#00#, 16#0F#, 16#80#, 16#00#,
16#00#, 16#03#, 16#E0#, 16#00#, 16#00#, 16#00#, 16#F0#, 16#00#, 16#00#,
16#00#, 16#7C#, 16#00#, 16#00#, 16#00#, 16#1F#, 16#00#, 16#00#, 16#00#,
16#07#, 16#C0#, 16#00#, 16#00#, 16#03#, 16#E0#, 16#00#, 16#00#, 16#01#,
16#F8#, 16#00#, 16#00#, 16#03#, 16#FC#, 16#00#, 16#00#, 16#01#, 16#FE#,
16#00#, 16#00#, 16#00#, 16#FF#, 16#00#, 16#00#, 16#00#, 16#3F#, 16#E0#,
16#00#, 16#00#, 16#07#, 16#F8#, 16#00#, 16#00#, 16#00#, 16#3F#, 16#00#,
16#00#, 16#00#, 16#07#, 16#C0#, 16#00#, 16#00#, 16#01#, 16#E0#, 16#00#,
16#00#, 16#00#, 16#78#, 16#00#, 16#00#, 16#00#, 16#3E#, 16#00#, 16#00#,
16#00#, 16#0F#, 16#80#, 16#00#, 16#00#, 16#03#, 16#E0#, 16#00#, 16#00#,
16#00#, 16#F0#, 16#00#, 16#00#, 16#00#, 16#7C#, 16#00#, 16#00#, 16#00#,
16#1F#, 16#80#, 16#00#, 16#00#, 16#07#, 16#FC#, 16#00#, 16#00#, 16#00#,
16#FF#, 16#00#, 16#00#, 16#00#, 16#3F#, 16#C0#, 16#00#, 16#00#, 16#07#,
16#F0#, 16#00#, 16#00#, 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#00#, 16#00#, 16#00#, 16#00#, 16#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#00#, 16#00#, 16#00#, 16#F0#, 16#00#, 16#00#,
16#00#, 16#7C#, 16#00#, 16#00#, 16#00#, 16#1F#, 16#00#, 16#00#, 16#00#,
16#07#, 16#C0#, 16#00#, 16#00#, 16#01#, 16#E0#, 16#00#, 16#00#, 16#00#,
16#78#, 16#00#, 16#00#, 16#00#, 16#3E#, 16#00#, 16#00#, 16#00#, 16#0F#,
16#80#, 16#00#, 16#00#, 16#03#, 16#E0#, 16#00#, 16#00#, 16#00#, 16#F0#,
16#00#, 16#00#, 16#00#, 16#7C#, 16#00#, 16#00#, 16#00#, 16#1F#, 16#00#,
16#00#, 16#00#, 16#07#, 16#C0#, 16#00#, 16#00#, 16#01#, 16#F0#, 16#00#,
16#00#, 16#00#, 16#78#, 16#00#, 16#00#, 16#00#, 16#3E#, 16#00#, 16#00#,
16#00#, 16#0F#, 16#80#, 16#00#, 16#00#, 16#03#, 16#E0#, 16#00#, 16#00#,
16#00#, 16#F0#, 16#00#, 16#00#, 16#00#, 16#3C#, 16#00#, 16#00#, 16#00#,
16#1F#, 16#00#, 16#00#, 16#00#, 16#07#, 16#C0#, 16#00#, 16#00#, 16#01#,
16#F0#, 16#00#, 16#00#, 16#00#, 16#78#, 16#00#, 16#00#, 16#00#, 16#3E#,
16#00#, 16#00#, 16#00#, 16#0F#, 16#80#, 16#00#, 16#00#, 16#03#, 16#E0#,
16#00#, 16#00#, 16#00#, 16#F8#, 16#00#, 16#00#, 16#00#, 16#3C#, 16#00#,
16#00#, 16#00#, 16#1F#, 16#00#, 16#00#, 16#00#, 16#07#, 16#C0#, 16#00#,
16#00#, 16#01#, 16#F0#, 16#00#, 16#00#, 16#00#, 16#78#, 16#00#, 16#00#,
16#00#, 16#1E#, 16#00#, 16#00#, 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#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#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#00#, 16#00#, 16#7F#, 16#00#, 16#00#, 16#00#, 16#1F#, 16#E0#,
16#00#, 16#00#, 16#07#, 16#F8#, 16#00#, 16#00#, 16#01#, 16#FE#, 16#00#,
16#00#, 16#00#, 16#0F#, 16#80#, 16#00#, 16#00#, 16#03#, 16#E0#, 16#00#,
16#00#, 16#00#, 16#78#, 16#00#, 16#00#, 16#00#, 16#3E#, 16#00#, 16#00#,
16#00#, 16#0F#, 16#80#, 16#00#, 16#00#, 16#03#, 16#E0#, 16#00#, 16#00#,
16#00#, 16#F0#, 16#00#, 16#00#, 16#00#, 16#3C#, 16#00#, 16#00#, 16#00#,
16#1F#, 16#00#, 16#00#, 16#00#, 16#07#, 16#C0#, 16#00#, 16#00#, 16#01#,
16#F0#, 16#00#, 16#00#, 16#00#, 16#7E#, 16#00#, 16#00#, 16#00#, 16#0F#,
16#F0#, 16#00#, 16#00#, 16#03#, 16#FC#, 16#00#, 16#00#, 16#00#, 16#7F#,
16#00#, 16#00#, 16#00#, 16#3F#, 16#C0#, 16#00#, 16#00#, 16#1F#, 16#E0#,
16#00#, 16#00#, 16#0F#, 16#80#, 16#00#, 16#00#, 16#07#, 16#C0#, 16#00#,
16#00#, 16#01#, 16#F0#, 16#00#, 16#00#, 16#00#, 16#7C#, 16#00#, 16#00#,
16#00#, 16#1E#, 16#00#, 16#00#, 16#00#, 16#0F#, 16#80#, 16#00#, 16#00#,
16#03#, 16#E0#, 16#00#, 16#00#, 16#00#, 16#F8#, 16#00#, 16#00#, 16#00#,
16#3C#, 16#00#, 16#00#, 16#00#, 16#3F#, 16#00#, 16#00#, 16#00#, 16#7F#,
16#C0#, 16#00#, 16#00#, 16#3F#, 16#E0#, 16#00#, 16#00#, 16#0F#, 16#F0#,
16#00#, 16#00#, 16#03#, 16#F8#, 16#00#, 16#00#, 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#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#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#C0#, 16#00#,
16#00#, 16#07#, 16#F8#, 16#00#, 16#00#, 16#03#, 16#FF#, 16#01#, 16#C0#,
16#01#, 16#FF#, 16#E0#, 16#F0#, 16#00#, 16#FF#, 16#FC#, 16#FC#, 16#00#,
16#7F#, 16#3F#, 16#FF#, 16#00#, 16#1F#, 16#07#, 16#FF#, 16#80#, 16#03#,
16#80#, 16#FF#, 16#C0#, 16#00#, 16#00#, 16#1F#, 16#C0#, 16#00#, 16#00#,
16#03#, 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#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 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 => 200,
Glyph_Width => 34,
Glyph_Height => 47,
Data => FreeMonoBoldOblique24pt7bBitmaps'Access);
Font : constant Bitmap_Font_Ref := Font_D'Access;
end GESTE_Fonts.FreeMonoBoldOblique24pt7b;
|
BrickBot/Bound-T-H8-300 | Ada | 12,724 | adb | -- Flow.Computation.Show (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.10 $
-- $Date: 2015/10/24 20:05:47 $
--
-- $Log: flow-computation-show.adb,v $
-- Revision 1.10 2015/10/24 20:05:47 niklas
-- Moved to free licence.
--
-- Revision 1.9 2008-04-26 14:36:51 niklas
-- Show also model index.
--
-- Revision 1.8 2008/02/15 20:27:43 niklas
-- BT-CH-0110: Better "&" for call-paths in Output loci.
--
-- Revision 1.7 2007/11/12 21:37:27 niklas
-- BT-CH-0097: Only arithmetic analysis marks boundable edge domain.
--
-- Revision 1.6 2007/10/11 11:58:47 niklas
-- Added Report_Unresolved_Flow, as in Flow.Show.
--
-- Revision 1.5 2005/06/28 07:06:48 niklas
-- Changed Show (Model) to omit the heading and the subprogram
-- name and to use Feasible_Mark in its legend.
--
-- Revision 1.4 2005/06/12 07:30:24 niklas
-- Changed the display of calls from A->B to A=>B, to avoid
-- confusion with '-' used in approximate line-numbers.
--
-- Revision 1.3 2005/04/18 12:58:25 niklas
-- Changed Report_Refs to issue at most one warning of each
-- kind (read memory, write memory) per inspected step.
--
-- Revision 1.2 2005/04/18 10:50:43 niklas
-- Added Report_Unresolved_Data.
--
-- Revision 1.1 2005/02/16 21:11:42 niklas
-- BT-CH-0002.
--
with Ada.Text_IO;
with Flow.Opt;
with Flow.Show;
with Output;
with Programs;
package body Flow.Computation.Show is
procedure Show (Model : in Model_T)
is
use Ada.Text_IO;
use type Arithmetic.Condition_T;
use type Calling.Protocol_Ref;
Margin : constant Positive_Count := Col;
-- The current column is taken as the left margin.
-- For step effects:
Effect_Col : constant Positive_Count := Margin + 6;
-- The column for the Effect of each step.
-- For edge conditions:
Arrow_Col : constant Positive_Count := Effect_Col;
-- The column for the Source->Target of each edge.
Cond_Col : constant Positive_Count := Arrow_Col + 12;
-- The column for the Cond of each edge.
-- For dynamic edges:
Dynamic_Edges : constant Dynamic_Edge_List_T :=
Flow.Dynamic_Edges (Model.Graph);
-- All the dynamic edges.
Dyn_Edge : Dynamic_Edge_T;
-- One of the Dynamic_Edges.
Dyn_Source : Step_Index_T;
-- The index of the source step of the Dyn_Edge.
Dyn_State_Col : constant Positive_Count := Margin + 10;
-- The column for the State of a dynamic edge.
Dyn_Edge_Col : constant Positive_Count := Dyn_State_Col + 10;
-- The column for the image of a dynamic edge.
-- For calling protocols:
Call_Step_Col : constant Positive_Count := Margin + 6;
-- The column for the index of the call-step of a call.
Call_Col : constant Positive_Count := Call_Step_Col + 6;
-- The column for the image of a call.
Proto_Col : constant Positive_Count := Call_Col + 25;
-- The column for the Protocol of each call.
-- Other variables:
Edge : Step_Edge_T;
-- One of the (step) edges.
Call : Programs.Call_T;
-- One of the calls.
Protocol : Calling.Protocol_Ref;
-- The protocol of the Call, or perhaps null.
begin
Set_Col (Margin);
Put_Line (
"Model #:"
& Natural'Image (Model.Index)
& ". References to this model:"
& Natural'Image (Model.References));
Set_Col (Margin);
Put_Line (
"A '"
& Feasible_Mark(True)
& "' means feasible, a '"
& Feasible_Mark(False)
& "' means infeasible.");
New_Line;
-- Show the effects:
Set_Col (Margin);
Put ("Step"); Set_Col (Effect_Col); Put_Line ("Effect");
for S in Model.Effect'Range loop
Set_Col (Margin);
Put (Feasible_Mark(Model.Feasible(S)));
Put (Step_Index_T'Image (S));
Set_Col (Effect_Col);
Put_Line (Arithmetic.Image (Model.Effect(S).all));
end loop;
New_Line;
-- Show the edge preconditions:
if Model.Condition'Length > 0 then
-- There are some edges to show.
Set_Col (Margin ); Put ("Edge");
Set_Col (Arrow_Col + 1); Put ("S -> T");
Set_Col (Cond_Col ); Put_Line ("Precondition");
for E in Model.Condition'Range loop
Set_Col (Margin);
Put (Feasible_Mark(Model.Condition(E) /= Arithmetic.Never));
Put (Step_Edge_Index_T'Image (E));
Edge := Edge_At (E, Model.Graph);
Set_Col (Arrow_Col);
Put (Step_Index_T'Image (Index (Source (Edge))));
Put (" ->");
Put (Step_Index_T'Image (Index (Target (Edge))));
Set_Col (Cond_Col);
Put_Line (Arithmetic.Image (Model.Condition(E)));
end loop;
New_Line;
end if;
-- Show the dynamic edges:
Set_Col (Margin);
if Dynamic_Edges'Length > 0 then
Put_Line ("Dynamic edges:");
Set_Col (Margin ); Put ("Source step");
Set_Col (Dyn_State_Col); Put ("State");
Set_Col (Dyn_Edge_Col ); Put_Line ("Dynamic edge");
for D in Dynamic_Edges'Range loop
Dyn_Edge := Dynamic_Edges(D);
Dyn_Source := Index (Source (Dyn_Edge.all));
Set_Col (Margin);
Put (Feasible_Mark(Model.Feasible(Dyn_Source)));
Put (Step_Index_T'Image (Dyn_Source));
Set_Col (Dyn_State_Col);
Put (Edge_Resolution_T'Image (State (Dyn_Edge.all)));
Set_Col (Dyn_Edge_Col);
Put_Line (Image (Dyn_Edge.all));
end loop;
New_Line;
end if;
-- Show the calling protocols:
if Model.Protocol'Length = 0 then
-- No calls to show.
Set_Col (Margin);
Put_Line ("No calls (leaf subprogram).");
else
-- There are some calls to show.
Set_Col (Margin ); Put ("Call");
Set_Col (Call_Step_Col); Put ("Step");
Set_Col (Call_Col );
Put ("Caller" & Output.Call_Mark & "Callee");
Set_Col (Proto_Col ); Put_Line ("Protocol");
for C in Model.Protocol'Range loop
Call := Programs.Call (
From => Model.Subprogram,
Index => C);
Protocol := Model.Protocol(C);
Set_Col (Margin);
Put (Feasible_Mark(Model.Feasible(Index (Programs.Step (Call)))));
Put (Programs.Call_Index_T'Image (Programs.Index (Call)));
Set_Col (Call_Step_Col);
Put (Step_Index_T'Image (Index (Programs.Step (Call))));
Set_Col (Call_Col);
Put (Programs.Image (Call));
Set_Col (Proto_Col);
if Protocol = null then
Put_Line ("(null)");
else
Put_Line (Calling.Image (Protocol.all));
end if;
end loop;
end if;
New_Line;
end Show;
procedure Show (Model : in Model_Ref)
is
begin
if Model.Ref /= null then
Show (Model => Model.Ref.all);
else
Ada.Text_IO.Put_Line ("No computation model.");
end if;
end Show;
procedure Report_Refs (
Step : in Step_T;
Effect : in Arithmetic.Effect_T;
Source : in Symbols.Symbol_Table_T)
--
-- Reports, as Warnings, any remaining unresolved dynamic data
-- references in the Effect of the Step.
--
is
Targets : Boolean := False;
Uses : Boolean := False;
-- Whether some assignment in the Effect targets a reference
-- or uses a reference, respectively.
begin
-- Check each assignment in the Effect:
for E in Effect'Range loop
Targets := Targets or Arithmetic.Targets_Reference (Effect(E));
Uses := Uses or Arithmetic.Uses_Reference (Effect(E));
end loop;
-- Report:
if Targets then
Output.Warning (
Locus => Flow.Show.Locus (Step, Source),
Text => "Unresolved dynamic memory write.");
end if;
if Uses then
Output.Warning (
Locus => Flow.Show.Locus (Step, Source),
Text => "Unresolved dynamic memory read.");
end if;
end Report_Refs;
procedure Report_Unresolved_Data (
Model : in Model_Ref;
Source : in Symbols.Symbol_Table_T)
is
Graph : Graph_T renames Model.Ref.Graph;
Effect : Effects_T renames Model.Ref.Effect;
Feasible : Feasibility_T renames Model.Ref.Feasible;
Condition : Conditions_T renames Model.Ref.Condition;
begin
-- Dynamic memory refs in the arithmetic effect:
for S in Effect'Range loop
if Feasible(S) then
Report_Refs (
Step => Step_At (Index => S, Within => Graph),
Effect => Effect(S).all,
Source => Source);
end if;
end loop;
-- Dynamic memory refs in the edge preconditions:
for E in Condition'Range loop
if Arithmetic.Uses_Reference (Condition(E)) then
-- The condition contains a Ref, which also means
-- that the edge is still considered feasible.
Output.Warning (
Locus =>
Flow.Show.Locus (
Step => Flow.Source (
Edge => Edge_At (Index => E, Within => Graph)),
Source => Source),
Text => "Unresolved dynamic memory read in condition.");
end if;
end loop;
-- TBA (perhaps) unresolved dynamic calling protocols.
end Report_Unresolved_Data;
procedure Report_Unresolved_Flow (
Model : in Model_Ref;
Source : in Symbols.Symbol_Table_T)
is
Edges : constant Dynamic_Edge_List_T := Dynamic_Edges (Model);
-- All the remaining feasible dynamic edges.
Edge : Dynamic_Edge_T;
-- One of the Edges.
Source_Locus : Output.Locus_T;
-- Locates the source step of the Edge.
begin
for E in Edges'Range loop
Edge := Edges(E);
Source_Locus := Flow.Show.Locus (Edge.Source, Source);
case Edge.State is
when Growing =>
Output.Note (
Locus => Source_Locus,
Text => "Dynamic control flow still growing.");
when Unresolved =>
Output.Error (
Locus => Source_Locus,
Text => "Unresolved dynamic control flow.");
when Stable =>
Output.Note (
Locus => Source_Locus,
Text => "Dynamic control flow stably resolved.");
end case;
if Opt.Trace_Flow_Resolution then
Output.Trace (Full_Image (Edge.all));
end if;
end loop;
end Report_Unresolved_Flow;
end Flow.Computation.Show;
|
OhYea777/Minix | Ada | 13,178 | adb | ----------------------------------------------------------------
-- ZLib for Ada thick binding. --
-- --
-- Copyright (C) 2002-2003 Dmitriy Anisimkov --
-- --
-- Open source license information is in the zlib.ads file. --
----------------------------------------------------------------
-- $Id: test.adb,v 1.1 2005/09/23 22:39:01 beng Exp $
-- The program has a few aims.
-- 1. Test ZLib.Ada95 thick binding functionality.
-- 2. Show the example of use main functionality of the ZLib.Ada95 binding.
-- 3. Build this program automatically compile all ZLib.Ada95 packages under
-- GNAT Ada95 compiler.
with ZLib.Streams;
with Ada.Streams.Stream_IO;
with Ada.Numerics.Discrete_Random;
with Ada.Text_IO;
with Ada.Calendar;
procedure Test is
use Ada.Streams;
use Stream_IO;
------------------------------------
-- Test configuration parameters --
------------------------------------
File_Size : Count := 100_000;
Continuous : constant Boolean := False;
Header : constant ZLib.Header_Type := ZLib.Default;
-- ZLib.None;
-- ZLib.Auto;
-- ZLib.GZip;
-- Do not use Header other then Default in ZLib versions 1.1.4
-- and older.
Strategy : constant ZLib.Strategy_Type := ZLib.Default_Strategy;
Init_Random : constant := 10;
-- End --
In_File_Name : constant String := "testzlib.in";
-- Name of the input file
Z_File_Name : constant String := "testzlib.zlb";
-- Name of the compressed file.
Out_File_Name : constant String := "testzlib.out";
-- Name of the decompressed file.
File_In : File_Type;
File_Out : File_Type;
File_Back : File_Type;
File_Z : ZLib.Streams.Stream_Type;
Filter : ZLib.Filter_Type;
Time_Stamp : Ada.Calendar.Time;
procedure Generate_File;
-- Generate file of spetsified size with some random data.
-- The random data is repeatable, for the good compression.
procedure Compare_Streams
(Left, Right : in out Root_Stream_Type'Class);
-- The procedure compearing data in 2 streams.
-- It is for compare data before and after compression/decompression.
procedure Compare_Files (Left, Right : String);
-- Compare files. Based on the Compare_Streams.
procedure Copy_Streams
(Source, Target : in out Root_Stream_Type'Class;
Buffer_Size : in Stream_Element_Offset := 1024);
-- Copying data from one stream to another. It is for test stream
-- interface of the library.
procedure Data_In
(Item : out Stream_Element_Array;
Last : out Stream_Element_Offset);
-- this procedure is for generic instantiation of
-- ZLib.Generic_Translate.
-- reading data from the File_In.
procedure Data_Out (Item : in Stream_Element_Array);
-- this procedure is for generic instantiation of
-- ZLib.Generic_Translate.
-- writing data to the File_Out.
procedure Stamp;
-- Store the timestamp to the local variable.
procedure Print_Statistic (Msg : String; Data_Size : ZLib.Count);
-- Print the time statistic with the message.
procedure Translate is new ZLib.Generic_Translate
(Data_In => Data_In,
Data_Out => Data_Out);
-- This procedure is moving data from File_In to File_Out
-- with compression or decompression, depend on initialization of
-- Filter parameter.
-------------------
-- Compare_Files --
-------------------
procedure Compare_Files (Left, Right : String) is
Left_File, Right_File : File_Type;
begin
Open (Left_File, In_File, Left);
Open (Right_File, In_File, Right);
Compare_Streams (Stream (Left_File).all, Stream (Right_File).all);
Close (Left_File);
Close (Right_File);
end Compare_Files;
---------------------
-- Compare_Streams --
---------------------
procedure Compare_Streams
(Left, Right : in out Ada.Streams.Root_Stream_Type'Class)
is
Left_Buffer, Right_Buffer : Stream_Element_Array (0 .. 16#FFF#);
Left_Last, Right_Last : Stream_Element_Offset;
begin
loop
Read (Left, Left_Buffer, Left_Last);
Read (Right, Right_Buffer, Right_Last);
if Left_Last /= Right_Last then
Ada.Text_IO.Put_Line ("Compare error :"
& Stream_Element_Offset'Image (Left_Last)
& " /= "
& Stream_Element_Offset'Image (Right_Last));
raise Constraint_Error;
elsif Left_Buffer (0 .. Left_Last)
/= Right_Buffer (0 .. Right_Last)
then
Ada.Text_IO.Put_Line ("ERROR: IN and OUT files is not equal.");
raise Constraint_Error;
end if;
exit when Left_Last < Left_Buffer'Last;
end loop;
end Compare_Streams;
------------------
-- Copy_Streams --
------------------
procedure Copy_Streams
(Source, Target : in out Ada.Streams.Root_Stream_Type'Class;
Buffer_Size : in Stream_Element_Offset := 1024)
is
Buffer : Stream_Element_Array (1 .. Buffer_Size);
Last : Stream_Element_Offset;
begin
loop
Read (Source, Buffer, Last);
Write (Target, Buffer (1 .. Last));
exit when Last < Buffer'Last;
end loop;
end Copy_Streams;
-------------
-- Data_In --
-------------
procedure Data_In
(Item : out Stream_Element_Array;
Last : out Stream_Element_Offset) is
begin
Read (File_In, Item, Last);
end Data_In;
--------------
-- Data_Out --
--------------
procedure Data_Out (Item : in Stream_Element_Array) is
begin
Write (File_Out, Item);
end Data_Out;
-------------------
-- Generate_File --
-------------------
procedure Generate_File is
subtype Visible_Symbols is Stream_Element range 16#20# .. 16#7E#;
package Random_Elements is
new Ada.Numerics.Discrete_Random (Visible_Symbols);
Gen : Random_Elements.Generator;
Buffer : Stream_Element_Array := (1 .. 77 => 16#20#) & 10;
Buffer_Count : constant Count := File_Size / Buffer'Length;
-- Number of same buffers in the packet.
Density : constant Count := 30; -- from 0 to Buffer'Length - 2;
procedure Fill_Buffer (J, D : in Count);
-- Change the part of the buffer.
-----------------
-- Fill_Buffer --
-----------------
procedure Fill_Buffer (J, D : in Count) is
begin
for K in 0 .. D loop
Buffer
(Stream_Element_Offset ((J + K) mod (Buffer'Length - 1) + 1))
:= Random_Elements.Random (Gen);
end loop;
end Fill_Buffer;
begin
Random_Elements.Reset (Gen, Init_Random);
Create (File_In, Out_File, In_File_Name);
Fill_Buffer (1, Buffer'Length - 2);
for J in 1 .. Buffer_Count loop
Write (File_In, Buffer);
Fill_Buffer (J, Density);
end loop;
-- fill remain size.
Write
(File_In,
Buffer
(1 .. Stream_Element_Offset
(File_Size - Buffer'Length * Buffer_Count)));
Flush (File_In);
Close (File_In);
end Generate_File;
---------------------
-- Print_Statistic --
---------------------
procedure Print_Statistic (Msg : String; Data_Size : ZLib.Count) is
use Ada.Calendar;
use Ada.Text_IO;
package Count_IO is new Integer_IO (ZLib.Count);
Curr_Dur : Duration := Clock - Time_Stamp;
begin
Put (Msg);
Set_Col (20);
Ada.Text_IO.Put ("size =");
Count_IO.Put
(Data_Size,
Width => Stream_IO.Count'Image (File_Size)'Length);
Put_Line (" duration =" & Duration'Image (Curr_Dur));
end Print_Statistic;
-----------
-- Stamp --
-----------
procedure Stamp is
begin
Time_Stamp := Ada.Calendar.Clock;
end Stamp;
begin
Ada.Text_IO.Put_Line ("ZLib " & ZLib.Version);
loop
Generate_File;
for Level in ZLib.Compression_Level'Range loop
Ada.Text_IO.Put_Line ("Level ="
& ZLib.Compression_Level'Image (Level));
-- Test generic interface.
Open (File_In, In_File, In_File_Name);
Create (File_Out, Out_File, Z_File_Name);
Stamp;
-- Deflate using generic instantiation.
ZLib.Deflate_Init
(Filter => Filter,
Level => Level,
Strategy => Strategy,
Header => Header);
Translate (Filter);
Print_Statistic ("Generic compress", ZLib.Total_Out (Filter));
ZLib.Close (Filter);
Close (File_In);
Close (File_Out);
Open (File_In, In_File, Z_File_Name);
Create (File_Out, Out_File, Out_File_Name);
Stamp;
-- Inflate using generic instantiation.
ZLib.Inflate_Init (Filter, Header => Header);
Translate (Filter);
Print_Statistic ("Generic decompress", ZLib.Total_Out (Filter));
ZLib.Close (Filter);
Close (File_In);
Close (File_Out);
Compare_Files (In_File_Name, Out_File_Name);
-- Test stream interface.
-- Compress to the back stream.
Open (File_In, In_File, In_File_Name);
Create (File_Back, Out_File, Z_File_Name);
Stamp;
ZLib.Streams.Create
(Stream => File_Z,
Mode => ZLib.Streams.Out_Stream,
Back => ZLib.Streams.Stream_Access
(Stream (File_Back)),
Back_Compressed => True,
Level => Level,
Strategy => Strategy,
Header => Header);
Copy_Streams
(Source => Stream (File_In).all,
Target => File_Z);
-- Flushing internal buffers to the back stream.
ZLib.Streams.Flush (File_Z, ZLib.Finish);
Print_Statistic ("Write compress",
ZLib.Streams.Write_Total_Out (File_Z));
ZLib.Streams.Close (File_Z);
Close (File_In);
Close (File_Back);
-- Compare reading from original file and from
-- decompression stream.
Open (File_In, In_File, In_File_Name);
Open (File_Back, In_File, Z_File_Name);
ZLib.Streams.Create
(Stream => File_Z,
Mode => ZLib.Streams.In_Stream,
Back => ZLib.Streams.Stream_Access
(Stream (File_Back)),
Back_Compressed => True,
Header => Header);
Stamp;
Compare_Streams (Stream (File_In).all, File_Z);
Print_Statistic ("Read decompress",
ZLib.Streams.Read_Total_Out (File_Z));
ZLib.Streams.Close (File_Z);
Close (File_In);
Close (File_Back);
-- Compress by reading from compression stream.
Open (File_Back, In_File, In_File_Name);
Create (File_Out, Out_File, Z_File_Name);
ZLib.Streams.Create
(Stream => File_Z,
Mode => ZLib.Streams.In_Stream,
Back => ZLib.Streams.Stream_Access
(Stream (File_Back)),
Back_Compressed => False,
Level => Level,
Strategy => Strategy,
Header => Header);
Stamp;
Copy_Streams
(Source => File_Z,
Target => Stream (File_Out).all);
Print_Statistic ("Read compress",
ZLib.Streams.Read_Total_Out (File_Z));
ZLib.Streams.Close (File_Z);
Close (File_Out);
Close (File_Back);
-- Decompress to decompression stream.
Open (File_In, In_File, Z_File_Name);
Create (File_Back, Out_File, Out_File_Name);
ZLib.Streams.Create
(Stream => File_Z,
Mode => ZLib.Streams.Out_Stream,
Back => ZLib.Streams.Stream_Access
(Stream (File_Back)),
Back_Compressed => False,
Header => Header);
Stamp;
Copy_Streams
(Source => Stream (File_In).all,
Target => File_Z);
Print_Statistic ("Write decompress",
ZLib.Streams.Write_Total_Out (File_Z));
ZLib.Streams.Close (File_Z);
Close (File_In);
Close (File_Back);
Compare_Files (In_File_Name, Out_File_Name);
end loop;
Ada.Text_IO.Put_Line (Count'Image (File_Size) & " Ok.");
exit when not Continuous;
File_Size := File_Size + 1;
end loop;
end Test;
|
bmsauer/termbox-ada | Ada | 19,700 | ads | pragma Ada_2005;
pragma Style_Checks (Off);
with Interfaces.C; use Interfaces.C;
with x86_64_linux_gnu_bits_stdint_uintn_h;
with x86_64_linux_gnu_bits_stdint_intn_h;
with Interfaces.C.Strings;
package termbox_h is
-- unsupported macro: SO_IMPORT __attribute__((visibility("default")))
TB_KEY_F1 : constant := (16#FFFF#-0); -- termbox/include/termbox.h:21
TB_KEY_F2 : constant := (16#FFFF#-1); -- termbox/include/termbox.h:22
TB_KEY_F3 : constant := (16#FFFF#-2); -- termbox/include/termbox.h:23
TB_KEY_F4 : constant := (16#FFFF#-3); -- termbox/include/termbox.h:24
TB_KEY_F5 : constant := (16#FFFF#-4); -- termbox/include/termbox.h:25
TB_KEY_F6 : constant := (16#FFFF#-5); -- termbox/include/termbox.h:26
TB_KEY_F7 : constant := (16#FFFF#-6); -- termbox/include/termbox.h:27
TB_KEY_F8 : constant := (16#FFFF#-7); -- termbox/include/termbox.h:28
TB_KEY_F9 : constant := (16#FFFF#-8); -- termbox/include/termbox.h:29
TB_KEY_F10 : constant := (16#FFFF#-9); -- termbox/include/termbox.h:30
TB_KEY_F11 : constant := (16#FFFF#-10); -- termbox/include/termbox.h:31
TB_KEY_F12 : constant := (16#FFFF#-11); -- termbox/include/termbox.h:32
TB_KEY_INSERT : constant := (16#FFFF#-12); -- termbox/include/termbox.h:33
TB_KEY_DELETE : constant := (16#FFFF#-13); -- termbox/include/termbox.h:34
TB_KEY_HOME : constant := (16#FFFF#-14); -- termbox/include/termbox.h:35
TB_KEY_END : constant := (16#FFFF#-15); -- termbox/include/termbox.h:36
TB_KEY_PGUP : constant := (16#FFFF#-16); -- termbox/include/termbox.h:37
TB_KEY_PGDN : constant := (16#FFFF#-17); -- termbox/include/termbox.h:38
TB_KEY_ARROW_UP : constant := (16#FFFF#-18); -- termbox/include/termbox.h:39
TB_KEY_ARROW_DOWN : constant := (16#FFFF#-19); -- termbox/include/termbox.h:40
TB_KEY_ARROW_LEFT : constant := (16#FFFF#-20); -- termbox/include/termbox.h:41
TB_KEY_ARROW_RIGHT : constant := (16#FFFF#-21); -- termbox/include/termbox.h:42
TB_KEY_MOUSE_LEFT : constant := (16#FFFF#-22); -- termbox/include/termbox.h:43
TB_KEY_MOUSE_RIGHT : constant := (16#FFFF#-23); -- termbox/include/termbox.h:44
TB_KEY_MOUSE_MIDDLE : constant := (16#FFFF#-24); -- termbox/include/termbox.h:45
TB_KEY_MOUSE_RELEASE : constant := (16#FFFF#-25); -- termbox/include/termbox.h:46
TB_KEY_MOUSE_WHEEL_UP : constant := (16#FFFF#-26); -- termbox/include/termbox.h:47
TB_KEY_MOUSE_WHEEL_DOWN : constant := (16#FFFF#-27); -- termbox/include/termbox.h:48
TB_KEY_CTRL_TILDE : constant := 16#00#; -- termbox/include/termbox.h:51
TB_KEY_CTRL_2 : constant := 16#00#; -- termbox/include/termbox.h:52
TB_KEY_CTRL_A : constant := 16#01#; -- termbox/include/termbox.h:53
TB_KEY_CTRL_B : constant := 16#02#; -- termbox/include/termbox.h:54
TB_KEY_CTRL_C : constant := 16#03#; -- termbox/include/termbox.h:55
TB_KEY_CTRL_D : constant := 16#04#; -- termbox/include/termbox.h:56
TB_KEY_CTRL_E : constant := 16#05#; -- termbox/include/termbox.h:57
TB_KEY_CTRL_F : constant := 16#06#; -- termbox/include/termbox.h:58
TB_KEY_CTRL_G : constant := 16#07#; -- termbox/include/termbox.h:59
TB_KEY_BACKSPACE : constant := 16#08#; -- termbox/include/termbox.h:60
TB_KEY_CTRL_H : constant := 16#08#; -- termbox/include/termbox.h:61
TB_KEY_TAB : constant := 16#09#; -- termbox/include/termbox.h:62
TB_KEY_CTRL_I : constant := 16#09#; -- termbox/include/termbox.h:63
TB_KEY_CTRL_J : constant := 16#0A#; -- termbox/include/termbox.h:64
TB_KEY_CTRL_K : constant := 16#0B#; -- termbox/include/termbox.h:65
TB_KEY_CTRL_L : constant := 16#0C#; -- termbox/include/termbox.h:66
TB_KEY_ENTER : constant := 16#0D#; -- termbox/include/termbox.h:67
TB_KEY_CTRL_M : constant := 16#0D#; -- termbox/include/termbox.h:68
TB_KEY_CTRL_N : constant := 16#0E#; -- termbox/include/termbox.h:69
TB_KEY_CTRL_O : constant := 16#0F#; -- termbox/include/termbox.h:70
TB_KEY_CTRL_P : constant := 16#10#; -- termbox/include/termbox.h:71
TB_KEY_CTRL_Q : constant := 16#11#; -- termbox/include/termbox.h:72
TB_KEY_CTRL_R : constant := 16#12#; -- termbox/include/termbox.h:73
TB_KEY_CTRL_S : constant := 16#13#; -- termbox/include/termbox.h:74
TB_KEY_CTRL_T : constant := 16#14#; -- termbox/include/termbox.h:75
TB_KEY_CTRL_U : constant := 16#15#; -- termbox/include/termbox.h:76
TB_KEY_CTRL_V : constant := 16#16#; -- termbox/include/termbox.h:77
TB_KEY_CTRL_W : constant := 16#17#; -- termbox/include/termbox.h:78
TB_KEY_CTRL_X : constant := 16#18#; -- termbox/include/termbox.h:79
TB_KEY_CTRL_Y : constant := 16#19#; -- termbox/include/termbox.h:80
TB_KEY_CTRL_Z : constant := 16#1A#; -- termbox/include/termbox.h:81
TB_KEY_ESC : constant := 16#1B#; -- termbox/include/termbox.h:82
TB_KEY_CTRL_LSQ_BRACKET : constant := 16#1B#; -- termbox/include/termbox.h:83
TB_KEY_CTRL_3 : constant := 16#1B#; -- termbox/include/termbox.h:84
TB_KEY_CTRL_4 : constant := 16#1C#; -- termbox/include/termbox.h:85
TB_KEY_CTRL_BACKSLASH : constant := 16#1C#; -- termbox/include/termbox.h:86
TB_KEY_CTRL_5 : constant := 16#1D#; -- termbox/include/termbox.h:87
TB_KEY_CTRL_RSQ_BRACKET : constant := 16#1D#; -- termbox/include/termbox.h:88
TB_KEY_CTRL_6 : constant := 16#1E#; -- termbox/include/termbox.h:89
TB_KEY_CTRL_7 : constant := 16#1F#; -- termbox/include/termbox.h:90
TB_KEY_CTRL_SLASH : constant := 16#1F#; -- termbox/include/termbox.h:91
TB_KEY_CTRL_UNDERSCORE : constant := 16#1F#; -- termbox/include/termbox.h:92
TB_KEY_SPACE : constant := 16#20#; -- termbox/include/termbox.h:93
TB_KEY_BACKSPACE2 : constant := 16#7F#; -- termbox/include/termbox.h:94
TB_KEY_CTRL_8 : constant := 16#7F#; -- termbox/include/termbox.h:95
TB_MOD_ALT : constant := 16#01#; -- termbox/include/termbox.h:108
TB_MOD_MOTION : constant := 16#02#; -- termbox/include/termbox.h:109
TB_DEFAULT : constant := 16#00#; -- termbox/include/termbox.h:112
TB_BLACK : constant := 16#01#; -- termbox/include/termbox.h:113
TB_RED : constant := 16#02#; -- termbox/include/termbox.h:114
TB_GREEN : constant := 16#03#; -- termbox/include/termbox.h:115
TB_YELLOW : constant := 16#04#; -- termbox/include/termbox.h:116
TB_BLUE : constant := 16#05#; -- termbox/include/termbox.h:117
TB_MAGENTA : constant := 16#06#; -- termbox/include/termbox.h:118
TB_CYAN : constant := 16#07#; -- termbox/include/termbox.h:119
TB_WHITE : constant := 16#08#; -- termbox/include/termbox.h:120
TB_BOLD : constant := 16#0100#; -- termbox/include/termbox.h:127
TB_UNDERLINE : constant := 16#0200#; -- termbox/include/termbox.h:128
TB_REVERSE : constant := 16#0400#; -- termbox/include/termbox.h:129
TB_EVENT_KEY : constant := 1; -- termbox/include/termbox.h:143
TB_EVENT_RESIZE : constant := 2; -- termbox/include/termbox.h:144
TB_EVENT_MOUSE : constant := 3; -- termbox/include/termbox.h:145
TB_EUNSUPPORTED_TERMINAL : constant := -1; -- termbox/include/termbox.h:170
TB_EFAILED_TO_OPEN_TTY : constant := -2; -- termbox/include/termbox.h:171
TB_EPIPE_TRAP_ERROR : constant := -3; -- termbox/include/termbox.h:172
TB_HIDE_CURSOR : constant := -1; -- termbox/include/termbox.h:202
TB_INPUT_CURRENT : constant := 0; -- termbox/include/termbox.h:231
TB_INPUT_ESC : constant := 1; -- termbox/include/termbox.h:232
TB_INPUT_ALT : constant := 2; -- termbox/include/termbox.h:233
TB_INPUT_MOUSE : constant := 4; -- termbox/include/termbox.h:234
TB_OUTPUT_CURRENT : constant := 0; -- termbox/include/termbox.h:256
TB_OUTPUT_NORMAL : constant := 1; -- termbox/include/termbox.h:257
TB_OUTPUT_256 : constant := 2; -- termbox/include/termbox.h:258
TB_OUTPUT_216 : constant := 3; -- termbox/include/termbox.h:259
TB_OUTPUT_GRAYSCALE : constant := 4; -- termbox/include/termbox.h:260
TB_EOF : constant := -1; -- termbox/include/termbox.h:313
-- for shared objects
-- Key constants. See also struct tb_event's key field.
-- *
-- * These are a safe subset of terminfo keys, which exist on all popular
-- * terminals. Termbox uses only them to stay truly portable.
--
-- These are all ASCII code points below SPACE character and a BACKSPACE key.
-- These are non-existing ones.
-- *
-- * #define TB_KEY_CTRL_1 clash with '1'
-- * #define TB_KEY_CTRL_9 clash with '9'
-- * #define TB_KEY_CTRL_0 clash with '0'
--
-- * Alt modifier constant, see tb_event.mod field and tb_select_input_mode function.
-- * Mouse-motion modifier
--
-- Colors (see struct tb_cell's fg and bg fields).
-- Attributes, it is possible to use multiple attributes by combining them
-- * using bitwise OR ('|'). Although, colors cannot be combined. But you can
-- * combine attributes and a single color. See also struct tb_cell's fg and bg
-- * fields.
--
-- A cell, single conceptual entity on the terminal screen. The terminal screen
-- * is basically a 2d array of cells. It has the following fields:
-- * - 'ch' is a unicode character
-- * - 'fg' foreground color and attributes
-- * - 'bg' background color and attributes
--
type tb_cell is record
ch : aliased x86_64_linux_gnu_bits_stdint_uintn_h.uint32_t; -- termbox/include/termbox.h:138
fg : aliased x86_64_linux_gnu_bits_stdint_uintn_h.uint16_t; -- termbox/include/termbox.h:139
bg : aliased x86_64_linux_gnu_bits_stdint_uintn_h.uint16_t; -- termbox/include/termbox.h:140
end record;
pragma Convention (C_Pass_By_Copy, tb_cell); -- termbox/include/termbox.h:137
-- An event, single interaction from the user. The 'mod' and 'ch' fields are
-- * valid if 'type' is TB_EVENT_KEY. The 'w' and 'h' fields are valid if 'type'
-- * is TB_EVENT_RESIZE. The 'x' and 'y' fields are valid if 'type' is
-- * TB_EVENT_MOUSE. The 'key' field is valid if 'type' is either TB_EVENT_KEY
-- * or TB_EVENT_MOUSE. The fields 'key' and 'ch' are mutually exclusive; only
-- * one of them can be non-zero at a time.
--
type tb_event is record
c_type : aliased x86_64_linux_gnu_bits_stdint_uintn_h.uint8_t; -- termbox/include/termbox.h:155
c_mod : aliased x86_64_linux_gnu_bits_stdint_uintn_h.uint8_t; -- termbox/include/termbox.h:156
key : aliased x86_64_linux_gnu_bits_stdint_uintn_h.uint16_t; -- termbox/include/termbox.h:157
ch : aliased x86_64_linux_gnu_bits_stdint_uintn_h.uint32_t; -- termbox/include/termbox.h:158
w : aliased x86_64_linux_gnu_bits_stdint_intn_h.int32_t; -- termbox/include/termbox.h:159
h : aliased x86_64_linux_gnu_bits_stdint_intn_h.int32_t; -- termbox/include/termbox.h:160
x : aliased x86_64_linux_gnu_bits_stdint_intn_h.int32_t; -- termbox/include/termbox.h:161
y : aliased x86_64_linux_gnu_bits_stdint_intn_h.int32_t; -- termbox/include/termbox.h:162
end record;
pragma Convention (C_Pass_By_Copy, tb_event); -- termbox/include/termbox.h:154
-- modifiers to either 'key' or 'ch' below
-- one of the TB_KEY_* constants
-- unicode character
-- Error codes returned by tb_init(). All of them are self-explanatory, except
-- * the pipe trap error. Termbox uses unix pipes in order to deliver a message
-- * from a signal handler (SIGWINCH) to the main event reading loop. Honestly in
-- * most cases you should just check the returned code as < 0.
--
-- Initializes the termbox library. This function should be called before any
-- * other functions. Function tb_init is same as tb_init_file("/dev/tty").
-- * After successful initialization, the library must be
-- * finalized using the tb_shutdown() function.
--
function tb_init return int; -- termbox/include/termbox.h:179
pragma Import (C, tb_init, "tb_init");
function tb_init_file (name : Interfaces.C.Strings.chars_ptr) return int; -- termbox/include/termbox.h:180
pragma Import (C, tb_init_file, "tb_init_file");
function tb_init_fd (inout : int) return int; -- termbox/include/termbox.h:181
pragma Import (C, tb_init_fd, "tb_init_fd");
procedure tb_shutdown; -- termbox/include/termbox.h:182
pragma Import (C, tb_shutdown, "tb_shutdown");
-- Returns the size of the internal back buffer (which is the same as
-- * terminal's window size in characters). The internal buffer can be resized
-- * after tb_clear() or tb_present() function calls. Both dimensions have an
-- * unspecified negative value when called before tb_init() or after
-- * tb_shutdown().
--
function tb_width return int; -- termbox/include/termbox.h:190
pragma Import (C, tb_width, "tb_width");
function tb_height return int; -- termbox/include/termbox.h:191
pragma Import (C, tb_height, "tb_height");
-- Clears the internal back buffer using TB_DEFAULT color or the
-- * color/attributes set by tb_set_clear_attributes() function.
--
procedure tb_clear; -- termbox/include/termbox.h:196
pragma Import (C, tb_clear, "tb_clear");
procedure tb_set_clear_attributes (fg : x86_64_linux_gnu_bits_stdint_uintn_h.uint16_t; bg : x86_64_linux_gnu_bits_stdint_uintn_h.uint16_t); -- termbox/include/termbox.h:197
pragma Import (C, tb_set_clear_attributes, "tb_set_clear_attributes");
-- Synchronizes the internal back buffer with the terminal.
procedure tb_present; -- termbox/include/termbox.h:200
pragma Import (C, tb_present, "tb_present");
-- Sets the position of the cursor. Upper-left character is (0, 0). If you pass
-- * TB_HIDE_CURSOR as both coordinates, then the cursor will be hidden. Cursor
-- * is hidden by default.
--
procedure tb_set_cursor (cx : int; cy : int); -- termbox/include/termbox.h:208
pragma Import (C, tb_set_cursor, "tb_set_cursor");
-- Changes cell's parameters in the internal back buffer at the specified
-- * position.
--
procedure tb_put_cell
(x : int;
y : int;
cell : access constant tb_cell); -- termbox/include/termbox.h:213
pragma Import (C, tb_put_cell, "tb_put_cell");
procedure tb_change_cell
(x : int;
y : int;
ch : x86_64_linux_gnu_bits_stdint_uintn_h.uint32_t;
fg : x86_64_linux_gnu_bits_stdint_uintn_h.uint16_t;
bg : x86_64_linux_gnu_bits_stdint_uintn_h.uint16_t); -- termbox/include/termbox.h:214
pragma Import (C, tb_change_cell, "tb_change_cell");
-- Copies the buffer from 'cells' at the specified position, assuming the
-- * buffer is a two-dimensional array of size ('w' x 'h'), represented as a
-- * one-dimensional buffer containing lines of cells starting from the top.
-- *
-- * (DEPRECATED: use tb_cell_buffer() instead and copy memory on your own)
--
procedure tb_blit
(x : int;
y : int;
w : int;
h : int;
cells : access constant tb_cell); -- termbox/include/termbox.h:222
pragma Import (C, tb_blit, "tb_blit");
-- Returns a pointer to internal cell back buffer. You can get its dimensions
-- * using tb_width() and tb_height() functions. The pointer stays valid as long
-- * as no tb_clear() and tb_present() calls are made. The buffer is
-- * one-dimensional buffer containing lines of cells starting from the top.
--
function tb_cell_buffer return access tb_cell; -- termbox/include/termbox.h:229
pragma Import (C, tb_cell_buffer, "tb_cell_buffer");
-- Sets the termbox input mode. Termbox has two input modes:
-- * 1. Esc input mode.
-- * When ESC sequence is in the buffer and it doesn't match any known
-- * ESC sequence => ESC means TB_KEY_ESC.
-- * 2. Alt input mode.
-- * When ESC sequence is in the buffer and it doesn't match any known
-- * sequence => ESC enables TB_MOD_ALT modifier for the next keyboard event.
-- *
-- * You can also apply TB_INPUT_MOUSE via bitwise OR operation to either of the
-- * modes (e.g. TB_INPUT_ESC | TB_INPUT_MOUSE). If none of the main two modes
-- * were set, but the mouse mode was, TB_INPUT_ESC mode is used. If for some
-- * reason you've decided to use (TB_INPUT_ESC | TB_INPUT_ALT) combination, it
-- * will behave as if only TB_INPUT_ESC was selected.
-- *
-- * If 'mode' is TB_INPUT_CURRENT, it returns the current input mode.
-- *
-- * Default termbox input mode is TB_INPUT_ESC.
--
function tb_select_input_mode (mode : int) return int; -- termbox/include/termbox.h:254
pragma Import (C, tb_select_input_mode, "tb_select_input_mode");
-- Sets the termbox output mode. Termbox has three output options:
-- * 1. TB_OUTPUT_NORMAL => [1..8]
-- * This mode provides 8 different colors:
-- * black, red, green, yellow, blue, magenta, cyan, white
-- * Shortcut: TB_BLACK, TB_RED, ...
-- * Attributes: TB_BOLD, TB_UNDERLINE, TB_REVERSE
-- *
-- * Example usage:
-- * tb_change_cell(x, y, '@', TB_BLACK | TB_BOLD, TB_RED);
-- *
-- * 2. TB_OUTPUT_256 => [0..256]
-- * In this mode you can leverage the 256 terminal mode:
-- * 0x00 - 0x07: the 8 colors as in TB_OUTPUT_NORMAL
-- * 0x08 - 0x0f: TB_* | TB_BOLD
-- * 0x10 - 0xe7: 216 different colors
-- * 0xe8 - 0xff: 24 different shades of grey
-- *
-- * Example usage:
-- * tb_change_cell(x, y, '@', 184, 240);
-- * tb_change_cell(x, y, '@', 0xb8, 0xf0);
-- *
-- * 3. TB_OUTPUT_216 => [0..216]
-- * This mode supports the 3rd range of the 256 mode only.
-- * But you don't need to provide an offset.
-- *
-- * 4. TB_OUTPUT_GRAYSCALE => [0..23]
-- * This mode supports the 4th range of the 256 mode only.
-- * But you dont need to provide an offset.
-- *
-- * Execute build/src/demo/output to see its impact on your terminal.
-- *
-- * If 'mode' is TB_OUTPUT_CURRENT, it returns the current output mode.
-- *
-- * Default termbox output mode is TB_OUTPUT_NORMAL.
--
function tb_select_output_mode (mode : int) return int; -- termbox/include/termbox.h:297
pragma Import (C, tb_select_output_mode, "tb_select_output_mode");
-- Wait for an event up to 'timeout' milliseconds and fill the 'event'
-- * structure with it, when the event is available. Returns the type of the
-- * event (one of TB_EVENT_* constants) or -1 if there was an error or 0 in case
-- * there were no event during 'timeout' period.
--
function tb_peek_event (event : access tb_event; timeout : int) return int; -- termbox/include/termbox.h:304
pragma Import (C, tb_peek_event, "tb_peek_event");
-- Wait for an event forever and fill the 'event' structure with it, when the
-- * event is available. Returns the type of the event (one of TB_EVENT_*
-- * constants) or -1 if there was an error.
--
function tb_poll_event (event : access tb_event) return int; -- termbox/include/termbox.h:310
pragma Import (C, tb_poll_event, "tb_poll_event");
-- Utility utf8 functions.
function tb_utf8_char_length (c : char) return int; -- termbox/include/termbox.h:314
pragma Import (C, tb_utf8_char_length, "tb_utf8_char_length");
function tb_utf8_char_to_unicode (c_out : access x86_64_linux_gnu_bits_stdint_uintn_h.uint32_t; c : Interfaces.C.Strings.chars_ptr) return int; -- termbox/include/termbox.h:315
pragma Import (C, tb_utf8_char_to_unicode, "tb_utf8_char_to_unicode");
function tb_utf8_unicode_to_char (c_out : Interfaces.C.Strings.chars_ptr; c : x86_64_linux_gnu_bits_stdint_uintn_h.uint32_t) return int; -- termbox/include/termbox.h:316
pragma Import (C, tb_utf8_unicode_to_char, "tb_utf8_unicode_to_char");
end termbox_h;
|
AdaCore/gpr | Ada | 1,739 | adb | with GPR2;
with GPR2.KB;
with GPR2.Log;
with GPR2.Project.Configuration; use GPR2.Project.Configuration;
with GPR2.Project.Tree;
with GPR2.Context;
with GPR2.Path_Name; use GPR2.Path_Name;
with GPR2.Path_Name.Set;
with GNAT.Directory_Operations; use GNAT.Directory_Operations;
with Ada.Strings.Unbounded;
with Ada.Text_IO;
procedure Main is
Tree : GPR2.Project.Tree.Object;
KB : GPR2.KB.Object := GPR2.KB.Create_Default (GPR2.KB.Default_Flags);
Cfg : Ada.Strings.Unbounded.Unbounded_String;
Msg : GPR2.Log.Object;
F : Ada.Text_IO.File_Type;
Pseudo_Rts : GPR2.Name_Type :=
GPR2.Name_Type (Get_Current_Dir & Dir_Separator & "pseudo_rts");
begin
Cfg := KB.Configuration
(Description_Set'(1 => Create (Language => GPR2.Ada_Language,
Runtime => Pseudo_Rts)),
GPR2.KB.Default_Target,
Msg);
Ada.Text_IO.Create (F, Ada.Text_IO.Out_File, "cfg.cgpr");
Ada.Text_IO.Put_Line (F, Ada.Strings.Unbounded.To_String (Cfg));
Ada.Text_IO.Close (F);
Tree.Load_Autoconf
(Filename => GPR2.Path_Name.Create_File
("prj1.gpr"),
Context => GPR2.Context.Empty);
Ada.Text_IO.Put_Line
(String
(Tree.Runtime_Project.Path_Name.Containing_Directory.Simple_Name));
Tree.Unload;
Tree.Load_Autoconf
(Filename => GPR2.Path_Name.Create_File
("prj2.gpr"),
Context => GPR2.Context.Empty);
if Tree.Has_Messages then
for C in Tree.Log_Messages.Iterate (False)
loop
Ada.Text_IO.Put_Line (GPR2.Log.Element (C).Format);
end loop;
end if;
Ada.Text_IO.Put_Line
(String
(Tree.Runtime_Project.Path_Name.Containing_Directory.Simple_Name));
Tree.Unload;
end Main;
|
luk9400/nsi | Ada | 338 | adb | package body Primes with SPARK_Mode is
function IsPrime (N : in Positive) return Boolean is
begin
for I in Positive range 2 .. N - 1 loop
if N rem I = 0 then
return False;
end if;
pragma Loop_Invariant (for all J in 2 .. I => N rem J /= 0);
end loop;
return True;
end IsPrime;
end Primes;
|
AdaCore/Ada_Drivers_Library | Ada | 1,829 | ads | -- This package was generated by the Ada_Drivers_Library project wizard script
package ADL_Config is
Architecture : constant String := "RISC-V"; -- From board definition
Board : constant String := "Unleashed"; -- From command line
CPU_Core : constant String := "RISC-V64"; -- From mcu definition
Device_Family : constant String := "U5"; -- From board definition
Device_Name : constant String := "U540"; -- From board definition
Has_Ravenscar_Full_Runtime : constant String := "True"; -- From board definition
Has_Ravenscar_SFP_Runtime : constant String := "True"; -- From board definition
Has_ZFP_Runtime : constant String := "True"; -- From board definition
Max_Mount_Name_Length : constant := 128; -- From default value
Max_Mount_Points : constant := 2; -- From default value
Max_Path_Length : constant := 1024; -- From default value
Number_Of_Interrupts : constant := 0; -- From default value
Runtime_Name : constant String := "light-tasking-unleashed"; -- From default value
Runtime_Name_Suffix : constant String := "unleashed"; -- From board definition
Runtime_Profile : constant String := "light-tasking"; -- From command line
Use_Startup_Gen : constant Boolean := False; -- From command line
Vendor : constant String := "SiFive"; -- From board definition
end ADL_Config;
|
yannickmoy/StratoX | Ada | 12,512 | adb | -- Institution: Technische Universitaet Muenchen
-- Department: Realtime Computer Systems (RCS)
-- Project: StratoX
-- Author: Martin Becker ([email protected])
with Ada.Unchecked_Conversion;
-- @summary convert various types to bytearrays
-- FIXME: optimize: don't collect labels and formats unless we are building the header.
package body ULog.Conversions with SPARK_Mode is
----------------------
-- Enoding of types
----------------------
-- Format characters in the format string for binary log messages
-- DONE:
-- f : float
-- Z : char[64]
-- B : uint8_t
-- b : int8_t
-- H : uint16_t
-- h : int16_t
-- i : int32_t
-- I : uint32_t
-- q : int64_t
-- Q : uint64_t
-- TODO:
-- n : char[4]
-- N : char[16]
-- c : int16_t * 100
-- C : uint16_t * 100
-- e : int32_t * 100
-- E : uint32_t * 100
-- L : int32_t latitude/longitude
-- M : uint8_t flight mode
----------------
-- PROTOTYPES
----------------
procedure Add_Labeled (t : in out Conversion_Tag;
label : String;
format : Character;
buf : in out HIL.Byte_Array;
tail : HIL.Byte_Array)
with Pre => label'Length > 0 and then label'First <= label'Last;
procedure Copy_To_Buffer (t : in out Conversion_Tag;
buf : in out HIL.Byte_Array;
tail : HIL.Byte_Array);
function Buffer_Capacity (t : in Conversion_Tag; buf : HIL.Byte_Array)
return Natural
with Post => (if buf'Length <= t.Buffer_Fill then
Buffer_Capacity'Result = 0
else
Buffer_Capacity'Result = buf'Length - t.Buffer_Fill);
-- if the buffer length changed during conversion, then t.Total_Size could be
-- bigger than buf'length.
-----------
-- Reset
-----------
procedure New_Conversion (t : out Conversion_Tag) is
begin
t.Buffer_Fill := 0;
t.Buffer_Overflow := False;
t.Name := (others => HIL.Byte (0));
t.Label_Collect := (Labels => (others => HIL.Byte (0)), Length => 0);
t.Format_Collect := (Format => (others => HIL.Byte (0)), Length => 0);
end New_Conversion;
--------------
-- Get_Size
--------------
function Get_Size (t : in Conversion_Tag) return Natural is (t.Buffer_Fill);
---------------------
-- Buffer_Overflow
---------------------
function Buffer_Overflow (t : in Conversion_Tag) return Boolean is (t.Buffer_Overflow);
---------------
-- Get_Format
---------------
function Get_Format (t : in Conversion_Tag) return ULog_Format is (t.Format_Collect.Format);
---------------
-- Get_Labels
---------------
function Get_Labels (t : in Conversion_Tag) return ULog_Label is (t.Label_Collect.Labels);
---------------
-- Get_Name
---------------
function Get_Name (t : in Conversion_Tag) return ULog_Name is (t.Name);
---------------
-- Set_Name
---------------
procedure Set_Name (t : in out Conversion_Tag; s : String) is
subtype shortname is String (1 .. ULog_Name'Length);
function To_Name is new Ada.Unchecked_Conversion (shortname, ULog_Name);
tmp : shortname := (others => Character'Val (0));
slen : constant Integer := (if s'Length > tmp'Length then tmp'Length else s'Length);
begin
if slen > 0 then
tmp (tmp'First .. tmp'First + (slen - 1)) := s (s'First .. s'First + (slen - 1));
end if;
t.Name := To_Name (tmp);
end Set_Name;
---------------------
-- BUffer_Capacity
---------------------
function Buffer_Capacity (t : in Conversion_Tag; buf : HIL.Byte_Array)
return Natural is
fill : constant Natural := t.Buffer_Fill;
blen : constant Natural := buf'Length;
cap : Natural;
begin
if blen > fill then
cap := blen - fill;
else
cap := 0;
end if;
return cap;
end Buffer_Capacity;
-------------------
-- Add_To_Buffer
-------------------
-- add as much as we can to the buffer, without overflowing
procedure Copy_To_Buffer (t : in out Conversion_Tag;
buf : in out HIL.Byte_Array; tail : HIL.Byte_Array) is
cap : constant Natural := Buffer_Capacity (t, buf);
fill : constant Natural := t.Buffer_Fill;
tlen : constant Natural := tail'Length;
begin
if tlen > 0 and then cap >= tlen and
then buf'Length >= fill -- buffer inconsistency .. don't continue
then
-- this means the buffer can take all of it
declare
idx_l : constant Integer := buf'First + fill;
idx_h : constant Integer := idx_l + (tlen - 1);
begin
buf (idx_l .. idx_h) := tail;
end;
-- bookkeeping
if Natural'Last - fill >= tlen then
t.Buffer_Fill := fill + tlen;
else
t.Buffer_Fill := Natural'Last;
end if;
else
t.Buffer_Overflow := True;
end if;
end Copy_To_Buffer;
------------------------
-- Append_Labeled
------------------------
procedure Add_Labeled (t : in out Conversion_Tag;
label : String;
format : Character;
buf : in out HIL.Byte_Array;
tail : HIL.Byte_Array)
is
lbl_cap : constant Integer := t.Label_Collect.Labels'Length - t.Label_Collect.Length;
fmt_cap : constant Integer := t.Format_Collect.Format'Length - t.Format_Collect.Length;
begin
if Buffer_Capacity (t, buf) >= tail'Length and
then lbl_cap > label'Length -- not >=, because of ','
and then fmt_cap > 0
then
Copy_To_Buffer (t => t, buf => buf, tail => tail);
if t.Label_Collect.Length > 0 then
t.Label_Collect.Length := t.Label_Collect.Length + 1;
t.Label_Collect.Labels (t.Label_Collect.Length) := HIL.Byte (Character'Pos (','));
end if;
declare
idx_lbl_lo : constant Integer := t.Label_Collect.Labels'First + t.Label_Collect.Length;
idx_lbl_hi : constant Integer := idx_lbl_lo + (label'Length - 1);
idx_fmt : constant Integer := t.Format_Collect.Format'First + t.Format_Collect.Length;
subtype VarString is String (1 .. label'Length);
subtype VarBytes is HIL.Byte_Array (1 .. label'Length);
function To_Bytes is new Ada.Unchecked_Conversion (VarString, VarBytes);
d : constant VarBytes := To_Bytes (label);
begin
t.Label_Collect.Labels (idx_lbl_lo .. idx_lbl_hi) := d;
t.Format_Collect.Format (idx_fmt) := HIL.Byte (Character'Pos (format));
end;
end if;
-- keep counting, so caller can see potential overflow
if Natural'Last - t.Label_Collect.Length > label'Length then
t.Label_Collect.Length := t.Label_Collect.Length + label'Length;
else
t.Label_Collect.Length := Natural'Last;
end if;
if Natural'Last - t.Format_Collect.Length > 0 then
t.Format_Collect.Length := t.Format_Collect.Length + 1;
else
t.Format_Collect.Length := Natural'Last;
end if;
end Add_Labeled;
----------------------------
-- Append_Unlabeled_Bytes
----------------------------
procedure Append_Unlabeled_Bytes (t : in out Conversion_Tag;
buf : in out HIL.Byte_Array;
tail : HIL.Byte_Array) is
begin
Copy_To_Buffer (t => t, buf => buf, tail => tail);
end Append_Unlabeled_Bytes;
------------------
-- Append_Float
------------------
procedure Append_Float (t : in out Conversion_Tag; label : String;
buf : in out HIL.Byte_Array; tail : Float) is
subtype Byte4 is Byte_Array (1 .. 4);
function To_Bytes is new Ada.Unchecked_Conversion (Float, Byte4);
begin
Add_Labeled (t, label, 'f', buf, To_Bytes (tail));
end Append_Float;
------------------
-- Append_Uint8
------------------
procedure Append_Uint8 (t : in out Conversion_Tag; label : String;
buf : in out HIL.Byte_Array; tail : Unsigned_8) is
barr : constant Byte_Array := (1 => HIL.Byte (tail));
begin
Add_Labeled (t, label, 'B', buf, barr);
end Append_Uint8;
------------------
-- Append_Int8
------------------
procedure Append_Int8 (t : in out Conversion_Tag; label : String;
buf : in out HIL.Byte_Array; tail : Integer_8) is
subtype Byte1 is Byte_Array (1 .. 1);
function To_Bytes is new Ada.Unchecked_Conversion (Integer_8, Byte1);
begin
Add_Labeled (t, label, 'b', buf, To_Bytes (tail));
end Append_Int8;
------------------
-- Append_Uint16
------------------
procedure Append_Uint16 (t : in out Conversion_Tag; label : String;
buf : in out HIL.Byte_Array; tail : Unsigned_16) is
subtype Byte2 is Byte_Array (1 .. 2);
function To_Bytes is new Ada.Unchecked_Conversion (Unsigned_16, Byte2);
begin
Add_Labeled (t, label, 'H', buf, To_Bytes (tail));
end Append_Uint16;
------------------
-- Append_Int16
------------------
procedure Append_Int16 (t : in out Conversion_Tag; label : String;
buf : in out HIL.Byte_Array; tail : Integer_16) is
subtype Byte2 is Byte_Array (1 .. 2);
function To_Bytes is new Ada.Unchecked_Conversion (Integer_16, Byte2);
begin
Add_Labeled (t, label, 'h', buf, To_Bytes (tail));
end Append_Int16;
------------------
-- Append_UInt32
------------------
procedure Append_Uint32 (t : in out Conversion_Tag; label : String;
buf : in out HIL.Byte_Array; tail : Unsigned_32) is
subtype Byte4 is Byte_Array (1 .. 4);
function To_Bytes is new Ada.Unchecked_Conversion (Unsigned_32, Byte4);
begin
Add_Labeled (t, label, 'I', buf, To_Bytes (tail));
end Append_Uint32;
------------------
-- Append_Int32
------------------
procedure Append_Int32 (t : in out Conversion_Tag; label : String;
buf : in out HIL.Byte_Array; tail : Integer_32) is
subtype Byte4 is Byte_Array (1 .. 4);
function To_Bytes is new Ada.Unchecked_Conversion (Integer_32, Byte4);
begin
Add_Labeled (t, label, 'i', buf, To_Bytes (tail));
end Append_Int32;
------------------
-- Append_UInt64
------------------
procedure Append_Uint64 (t : in out Conversion_Tag; label : String;
buf : in out HIL.Byte_Array; tail : Unsigned_64) is
subtype Byte8 is Byte_Array (1 .. 8);
function To_Bytes is new Ada.Unchecked_Conversion (Unsigned_64, Byte8);
begin
Add_Labeled (t, label, 'Q', buf, To_Bytes (tail));
end Append_Uint64;
------------------
-- Append_Int64
------------------
procedure Append_Int64 (t : in out Conversion_Tag; label : String;
buf : in out HIL.Byte_Array; tail : Integer_64) is
subtype Byte8 is Byte_Array (1 .. 8);
function To_Bytes is new Ada.Unchecked_Conversion (Integer_64, Byte8);
begin
Add_Labeled (t, label, 'q', buf, To_Bytes (tail));
end Append_Int64;
-------------------
-- Append_String
-------------------
procedure Append_String64 (t : in out Conversion_Tag;
label : String;
buf : in out HIL.Byte_Array;
tail : String; slen : Natural)
is
subtype String64 is String (1 .. 64);
subtype Byte64 is Byte_Array (1 .. String64'Length);
function To_Byte64 is new Ada.Unchecked_Conversion (String64, Byte64);
tmp : String64 := (others => Character'Val (0));
len : constant Integer := (if slen > tmp'Length then tmp'Length else slen);
begin
if len > 0 then
tmp (tmp'First .. tmp'First + (len - 1)) := tail (tail'First .. tail'First + (len - 1));
end if;
Add_Labeled (t, label, 'Z', buf, To_Byte64 (tmp));
end Append_String64;
end ULog.Conversions;
|
AdaCore/gpr | Ada | 71 | adb | separate (Q)
function F return Boolean is
begin
return False;
end;
|
zhmu/ananas | Ada | 309 | ads | with Ada.Streams;
generic
package Inline20_G is
subtype Offset_Type is Ada.Streams.Stream_Element_Offset;
generic
type T is private;
package Nested_G is
procedure Get (Data : T; Into : out Offset_Type);
function F return Integer with Inline;
end Nested_G;
end Inline20_G;
|
thalium/icebox | Ada | 4,431 | adb | ----------------------------------------------------------------
-- ZLib for Ada thick binding. --
-- --
-- Copyright (C) 2002-2003 Dmitriy Anisimkov --
-- --
-- Open source license information is in the zlib.ads file. --
----------------------------------------------------------------
-- Continuous test for ZLib multithreading. If the test would fail
-- we should provide thread safe allocation routines for the Z_Stream.
--
-- $Id: mtest.adb $
with ZLib;
with Ada.Streams;
with Ada.Numerics.Discrete_Random;
with Ada.Text_IO;
with Ada.Exceptions;
with Ada.Task_Identification;
procedure MTest is
use Ada.Streams;
use ZLib;
Stop : Boolean := False;
pragma Atomic (Stop);
subtype Visible_Symbols is Stream_Element range 16#20# .. 16#7E#;
package Random_Elements is
new Ada.Numerics.Discrete_Random (Visible_Symbols);
task type Test_Task;
task body Test_Task is
Buffer : Stream_Element_Array (1 .. 100_000);
Gen : Random_Elements.Generator;
Buffer_First : Stream_Element_Offset;
Compare_First : Stream_Element_Offset;
Deflate : Filter_Type;
Inflate : Filter_Type;
procedure Further (Item : in Stream_Element_Array);
procedure Read_Buffer
(Item : out Ada.Streams.Stream_Element_Array;
Last : out Ada.Streams.Stream_Element_Offset);
-------------
-- Further --
-------------
procedure Further (Item : in Stream_Element_Array) is
procedure Compare (Item : in Stream_Element_Array);
-------------
-- Compare --
-------------
procedure Compare (Item : in Stream_Element_Array) is
Next_First : Stream_Element_Offset := Compare_First + Item'Length;
begin
if Buffer (Compare_First .. Next_First - 1) /= Item then
raise Program_Error;
end if;
Compare_First := Next_First;
end Compare;
procedure Compare_Write is new ZLib.Write (Write => Compare);
begin
Compare_Write (Inflate, Item, No_Flush);
end Further;
-----------------
-- Read_Buffer --
-----------------
procedure Read_Buffer
(Item : out Ada.Streams.Stream_Element_Array;
Last : out Ada.Streams.Stream_Element_Offset)
is
Buff_Diff : Stream_Element_Offset := Buffer'Last - Buffer_First;
Next_First : Stream_Element_Offset;
begin
if Item'Length <= Buff_Diff then
Last := Item'Last;
Next_First := Buffer_First + Item'Length;
Item := Buffer (Buffer_First .. Next_First - 1);
Buffer_First := Next_First;
else
Last := Item'First + Buff_Diff;
Item (Item'First .. Last) := Buffer (Buffer_First .. Buffer'Last);
Buffer_First := Buffer'Last + 1;
end if;
end Read_Buffer;
procedure Translate is new Generic_Translate
(Data_In => Read_Buffer,
Data_Out => Further);
begin
Random_Elements.Reset (Gen);
Buffer := (others => 20);
Main : loop
for J in Buffer'Range loop
Buffer (J) := Random_Elements.Random (Gen);
Deflate_Init (Deflate);
Inflate_Init (Inflate);
Buffer_First := Buffer'First;
Compare_First := Buffer'First;
Translate (Deflate);
if Compare_First /= Buffer'Last + 1 then
raise Program_Error;
end if;
Ada.Text_IO.Put_Line
(Ada.Task_Identification.Image
(Ada.Task_Identification.Current_Task)
& Stream_Element_Offset'Image (J)
& ZLib.Count'Image (Total_Out (Deflate)));
Close (Deflate);
Close (Inflate);
exit Main when Stop;
end loop;
end loop Main;
exception
when E : others =>
Ada.Text_IO.Put_Line (Ada.Exceptions.Exception_Information (E));
Stop := True;
end Test_Task;
Test : array (1 .. 4) of Test_Task;
pragma Unreferenced (Test);
Dummy : Character;
begin
Ada.Text_IO.Get_Immediate (Dummy);
Stop := True;
end MTest;
|
zhmu/ananas | Ada | 13,949 | ads | ------------------------------------------------------------------------------
-- --
-- GNAT COMPILER COMPONENTS --
-- --
-- S E M _ W A R N --
-- --
-- S p e c --
-- --
-- Copyright (C) 1999-2022, Free Software Foundation, Inc. --
-- --
-- GNAT is free software; you can redistribute it and/or modify it under --
-- terms of the GNU General Public License as published by the Free Soft- --
-- ware Foundation; either version 3, or (at your option) any later ver- --
-- sion. GNAT is distributed in the hope that it will be useful, but WITH- --
-- OUT ANY WARRANTY; without even the implied warranty of MERCHANTABILITY --
-- or FITNESS FOR A PARTICULAR PURPOSE. See the GNU General Public License --
-- for more details. You should have received a copy of the GNU General --
-- Public License distributed with GNAT; see file COPYING3. If not, go to --
-- http://www.gnu.org/licenses for a complete copy of the license. --
-- --
-- GNAT was originally developed by the GNAT team at New York University. --
-- Extensive contributions were provided by Ada Core Technologies Inc. --
-- --
------------------------------------------------------------------------------
-- This package contains the routines used to deal with issuing warnings
-- about uses of uninitialized variables and unused with's. It also has
-- some unrelated routines related to the generation of warnings.
with Alloc;
with Table;
with Types; use Types;
package Sem_Warn is
------------------------
-- Warnings Off Table --
------------------------
type Warnings_Off_Entry is record
N : Node_Id;
-- A pragma Warnings (Off, ent [,Reason]) node
E : Entity_Id;
-- The entity involved
R : String_Id;
-- Warning reason if present, or null if not (not currently used)
end record;
-- An entry is made in the following table for any valid Pragma Warnings
-- (Off, entity) encountered while Opt.Warn_On_Warnings_Off is True. It
-- is used to generate warnings on any of these pragmas that turn out not
-- to be needed, or that could be replaced by Unmodified/Unreferenced.
package Warnings_Off_Pragmas is new Table.Table (
Table_Component_Type => Warnings_Off_Entry,
Table_Index_Type => Int,
Table_Low_Bound => 0,
Table_Initial => Alloc.Warnings_Off_Pragmas_Initial,
Table_Increment => Alloc.Warnings_Off_Pragmas_Increment,
Table_Name => "Name_Warnings_Off_Pragmas");
--------------------
-- Initialization --
--------------------
procedure Initialize;
-- Initialize this package for new compilation
------------------------------------------
-- Routines to Handle Unused References --
------------------------------------------
procedure Check_References (E : Entity_Id; Anod : Node_Id := Empty);
-- Called at the end of processing a declarative region. The entity E
-- is the entity for the scope. All entities declared in the region,
-- as indicated by First_Entity and the entity chain, are checked to
-- see if they are variables for which warnings need to be posted for
-- either no assignments, or a use before an assignment or no references
-- at all. The Anod node is present for the case of an accept statement,
-- and references the accept statement. This is used to place the warning
-- messages in the right place.
procedure Check_Unset_Reference (N : Node_Id);
-- N is the node for an expression which occurs in a reference position,
-- e.g. as the right side of an assignment. This procedure checks to see
-- if the node is a reference to a variable entity where the entity has
-- Not_Assigned set. If so, the Unset_Reference field is set if it is not
-- the first occurrence. No warning is posted, instead warnings will be
-- posted later by Check_References. The reason we do things that
-- way is that if there are no assignments anywhere, we prefer to flag
-- the entity, rather than a reference to it. Note that for the purposes
-- of this routine, a type conversion or qualified expression whose
-- expression is an entity is also processed. The reason that we do not
-- process these at the point of occurrence is that both these constructs
-- can occur in non-reference positions (e.g. as out parameters).
procedure Check_Unused_Withs (Spec_Unit : Unit_Number_Type := No_Unit);
-- This routine performs two kinds of checks. It checks that all with'ed
-- units are referenced, and that at least one entity of each with'ed
-- unit is referenced (the latter check catches units that are only
-- referenced in a use or package renaming statement). Appropriate
-- warning messages are generated if either of these situations is
-- detected.
--
-- A special case arises when a package body or a subprogram body with
-- a separate spec is being compiled. In this case, a with may appear
-- on the spec, but be needed only by the body. This still generates
-- a warning, but the text is different (the with is not redundant,
-- it is misplaced).
--
-- This special case is implemented by making an initial call to this
-- procedure with Spec_Unit set to the unit number of the separate spec.
-- This call does not generate any warning messages, but instead may
-- result in flags being set in the N_With_Clause node that record that
-- there was no use in the spec.
--
-- The main call (made after all units have been analyzed, with Spec_Unit
-- set to the default value of No_Unit) generates the required warnings
-- using the flags set by the initial call where appropriate to specialize
-- the text of the warning messages.
---------------------
-- Output Routines --
---------------------
procedure Output_Non_Modified_In_Out_Warnings;
-- Warnings about IN OUT parameters that could be IN are collected till
-- the end of the compilation process (see body of this routine for a
-- discussion of why this is done). This procedure outputs the warnings.
-- Note: this should be called before Output_Unreferenced_Messages, since
-- if we have an IN OUT warning, that's the one we want to see.
procedure Output_Obsolescent_Entity_Warnings (N : Node_Id; E : Entity_Id);
-- N is a reference to obsolescent entity E, for which appropriate warning
-- messages are to be generated (caller has already checked that warnings
-- are active and appropriate for this entity).
procedure Output_Unreferenced_Messages;
-- Warnings about unreferenced entities are collected till the end of
-- the compilation process (see Check_Unset_Reference for further
-- details). This procedure outputs waiting warnings, if any.
procedure Output_Unused_Warnings_Off_Warnings;
-- Warnings about pragma Warnings (Off, ent) statements that are unused,
-- or could be replaced by Unmodified/Unreferenced pragmas, are collected
-- till the end of the compilation process. This procedure outputs waiting
-- warnings if any.
----------------------------
-- Other Warning Routines --
----------------------------
procedure Check_Code_Statement (N : Node_Id);
-- Perform warning checks on a code statement node
procedure Check_Infinite_Loop_Warning (Loop_Statement : Node_Id);
-- N is the node for a loop statement. This procedure checks if a warning
-- for a possible infinite loop should be given for a suspicious WHILE or
-- EXIT WHEN condition.
procedure Check_Low_Bound_Tested (Expr : Node_Id);
-- Expr is the node for a comparison operation. This procedure checks if
-- the comparison is a source comparison of P'First with some other value
-- and if so, sets the Low_Bound_Tested flag on entity P to suppress
-- warnings about improper low bound assumptions (we assume that if the
-- code has a test that explicitly checks P'First, then it is not operating
-- in blind assumption mode).
procedure Warn_On_Constant_Valid_Condition (Op : Node_Id);
-- Determine the outcome of evaluating conditional or relational operator
-- Op assuming that its scalar operands are valid. Emit a warning when the
-- result of the evaluation is True or False.
procedure Warn_On_Known_Condition (C : Node_Id);
-- C is a node for a boolean expression resulting from a relational
-- or membership operation. If the expression has a compile time known
-- value, then a warning is output if all the following conditions hold:
--
-- 1. Original expression comes from source. We don't want to generate
-- warnings for internally generated conditionals.
--
-- 2. As noted above, the expression is a relational or membership
-- test, we don't want to generate warnings for boolean variables
-- since this is typical of conditional compilation in Ada.
--
-- 3. The expression appears in a statement, rather than a declaration.
-- In practice, most occurrences in declarations are legitimate
-- conditionalizations, but occurrences in statements are often
-- errors for which the warning is useful.
--
-- 4. The expression does not occur within an instantiation. A non-
-- static expression in a generic may become constant because of
-- the attributes of the actuals, and we do not want to warn on
-- these legitimate constant foldings.
--
-- If all these conditions are met, the warning is issued noting that
-- the result of the test is always false or always true as appropriate.
function Warn_On_Modified_As_Out_Parameter (E : Entity_Id) return Boolean;
-- Returns True if we should activate warnings for entity E being modified
-- as an out parameter. True if either Warn_On_Modified_Unread is set for
-- an only OUT parameter, or if Warn_On_All_Unread_Out_Parameters is set.
procedure Warn_On_Overlapping_Actuals (Subp : Entity_Id; N : Node_Id);
-- Called on a subprogram call. Checks whether an IN OUT actual that is
-- not by-copy may overlap with another actual, thus leading to aliasing
-- in the body of the called subprogram. This is indeed a warning in Ada
-- versions prior to Ada 2012, but, unless Opt.Error_To_Warning is set by
-- use of debug flag -gnatd.E, this is illegal and generates an error.
procedure Warn_On_Suspicious_Index (Name : Entity_Id; X : Node_Id);
-- This is called after resolving an indexed component or a slice. Name
-- is the entity for the name of the indexed array, and X is the subscript
-- for the indexed component case, or one of the bounds in the slice case.
-- If Name is an unconstrained parameter of a standard string type, and
-- the index is of the form of a literal or Name'Length [- literal], then
-- a warning is generated that the subscripting operation is possibly
-- incorrectly assuming a lower bound of 1.
procedure Warn_On_Suspicious_Update (N : Node_Id);
-- N is a semantically analyzed attribute reference Prefix'Update. Issue
-- a warning if Warn_On_Suspicious_Contract is set, and N is the left-hand
-- side or right-hand side of an equality or inequality of the form:
-- Prefix = Prefix'Update(...)
-- or
-- Prefix'Update(...) = Prefix
procedure Warn_On_Unassigned_Out_Parameter
(Return_Node : Node_Id;
Scope_Id : Entity_Id);
-- Called when processing a return statement given by Return_Node. Scope_Id
-- is the Entity_Id for the procedure in which the return statement lives.
-- A check is made for the case of a procedure with out parameters that
-- have not yet been assigned, and appropriate warnings are given.
procedure Warn_On_Useless_Assignment
(Ent : Entity_Id;
N : Node_Id := Empty);
-- Called to check if we have a case of a useless assignment to the given
-- entity Ent, as indicated by a non-empty Last_Assignment field. This call
-- should only be made if at least one of the flags Warn_On_Modified_Unread
-- or Warn_On_All_Unread_Out_Parameters is True, and if Ent is in the
-- extended main source unit. N is Empty for the end of block call
-- (warning message says value unreferenced), or it is the node for
-- an overwriting assignment (warning message points to this assignment).
procedure Warn_On_Useless_Assignments (E : Entity_Id);
pragma Inline (Warn_On_Useless_Assignments);
-- Called at the end of a block or subprogram. Scans the entities of the
-- block or subprogram to see if there are any variables for which useless
-- assignments were made (assignments whose values were never read).
----------------------
-- Utility Routines --
----------------------
function Has_Junk_Name (E : Entity_Id) return Boolean;
-- Return True if the entity name contains any of the following substrings:
-- discard
-- dummy
-- ignore
-- junk
-- unused
-- Used to suppress warnings on names matching these patterns. The contents
-- of Name_Buffer and Name_Len are destroyed by this call.
end Sem_Warn;
|
AdaCore/gpr | Ada | 113 | adb | package body A is
function Foo1 return String is separate;
function Foo2 return String is separate;
end A;
|
stcarrez/dynamo | Ada | 874 | ads | -----------------------------------------------------------------------
-- Test -- Test the code generation
-- Copyright (C) 2012 Stephane Carrez
-- Written by Stephane Carrez ([email protected])
--
-- Licensed under the Apache License, Version 2.0 (the "License");
-- you may not use this file except in compliance with the License.
-- You may obtain a copy of the License at
--
-- http://www.apache.org/licenses/LICENSE-2.0
--
-- Unless required by applicable law or agreed to in writing, software
-- distributed under the License is distributed on an "AS IS" BASIS,
-- WITHOUT WARRANTIES OR CONDITIONS OF ANY KIND, either express or implied.
-- See the License for the specific language governing permissions and
-- limitations under the License.
-----------------------------------------------------------------------
package Test is
end Test;
|
AdaCore/libadalang | Ada | 296 | adb | with Tuple;
procedure Main is
package My_Tuple is new Tuple (Integer, Float);
M : My_Tuple.Tuple;
function Foo return Integer is (12);
function Foo return Float is (15.0);
begin
M := (12, 15.0);
pragma Test_Statement;
M := (Foo, Foo);
pragma Test_Statement;
end Main;
|
reznikmm/matreshka | Ada | 25,355 | adb | ------------------------------------------------------------------------------
-- --
-- Matreshka Project --
-- --
-- Ada Modeling Framework --
-- --
-- Runtime Library Component --
-- --
------------------------------------------------------------------------------
-- --
-- Copyright © 2011-2012, Vadim Godunko <[email protected]> --
-- All rights reserved. --
-- --
-- Redistribution and use in source and binary forms, with or without --
-- modification, are permitted provided that the following conditions --
-- are met: --
-- --
-- * Redistributions of source code must retain the above copyright --
-- notice, this list of conditions and the following disclaimer. --
-- --
-- * Redistributions in binary form must reproduce the above copyright --
-- notice, this list of conditions and the following disclaimer in the --
-- documentation and/or other materials provided with the distribution. --
-- --
-- * Neither the name of the Vadim Godunko, IE nor the names of its --
-- contributors may be used to endorse or promote products derived from --
-- this software without specific prior written permission. --
-- --
-- THIS SOFTWARE IS PROVIDED BY THE COPYRIGHT HOLDERS AND CONTRIBUTORS --
-- "AS IS" AND ANY EXPRESS OR IMPLIED WARRANTIES, INCLUDING, BUT NOT --
-- LIMITED TO, THE IMPLIED WARRANTIES OF MERCHANTABILITY AND FITNESS FOR --
-- A PARTICULAR PURPOSE ARE DISCLAIMED. IN NO EVENT SHALL THE COPYRIGHT --
-- HOLDER OR CONTRIBUTORS BE LIABLE FOR ANY DIRECT, INDIRECT, INCIDENTAL, --
-- SPECIAL, EXEMPLARY, OR CONSEQUENTIAL DAMAGES (INCLUDING, BUT NOT LIMITED --
-- TO, PROCUREMENT OF SUBSTITUTE GOODS OR SERVICES; LOSS OF USE, DATA, OR --
-- PROFITS; OR BUSINESS INTERRUPTION) HOWEVER CAUSED AND ON ANY THEORY OF --
-- LIABILITY, WHETHER IN CONTRACT, STRICT LIABILITY, OR TORT (INCLUDING --
-- NEGLIGENCE OR OTHERWISE) ARISING IN ANY WAY OUT OF THE USE OF THIS --
-- SOFTWARE, EVEN IF ADVISED OF THE POSSIBILITY OF SUCH DAMAGE. --
-- --
------------------------------------------------------------------------------
-- $Revision$ $Date$
------------------------------------------------------------------------------
with AMF.Elements;
with AMF.Internals.Element_Collections;
with AMF.Internals.Helpers;
with AMF.Internals.Tables.UML_Attributes;
with AMF.Visitors.UML_Iterators;
with AMF.Visitors.UML_Visitors;
with League.Strings.Internals;
with Matreshka.Internals.Strings;
package body AMF.Internals.UML_Output_Pins is
-------------------
-- Enter_Element --
-------------------
overriding procedure Enter_Element
(Self : not null access constant UML_Output_Pin_Proxy;
Visitor : in out AMF.Visitors.Abstract_Visitor'Class;
Control : in out AMF.Visitors.Traverse_Control) is
begin
if Visitor in AMF.Visitors.UML_Visitors.UML_Visitor'Class then
AMF.Visitors.UML_Visitors.UML_Visitor'Class
(Visitor).Enter_Output_Pin
(AMF.UML.Output_Pins.UML_Output_Pin_Access (Self),
Control);
end if;
end Enter_Element;
-------------------
-- Leave_Element --
-------------------
overriding procedure Leave_Element
(Self : not null access constant UML_Output_Pin_Proxy;
Visitor : in out AMF.Visitors.Abstract_Visitor'Class;
Control : in out AMF.Visitors.Traverse_Control) is
begin
if Visitor in AMF.Visitors.UML_Visitors.UML_Visitor'Class then
AMF.Visitors.UML_Visitors.UML_Visitor'Class
(Visitor).Leave_Output_Pin
(AMF.UML.Output_Pins.UML_Output_Pin_Access (Self),
Control);
end if;
end Leave_Element;
-------------------
-- Visit_Element --
-------------------
overriding procedure Visit_Element
(Self : not null access constant UML_Output_Pin_Proxy;
Iterator : in out AMF.Visitors.Abstract_Iterator'Class;
Visitor : in out AMF.Visitors.Abstract_Visitor'Class;
Control : in out AMF.Visitors.Traverse_Control) is
begin
if Iterator in AMF.Visitors.UML_Iterators.UML_Iterator'Class then
AMF.Visitors.UML_Iterators.UML_Iterator'Class
(Iterator).Visit_Output_Pin
(Visitor,
AMF.UML.Output_Pins.UML_Output_Pin_Access (Self),
Control);
end if;
end Visit_Element;
--------------------
-- Get_Is_Control --
--------------------
overriding function Get_Is_Control
(Self : not null access constant UML_Output_Pin_Proxy)
return Boolean is
begin
return
AMF.Internals.Tables.UML_Attributes.Internal_Get_Is_Control
(Self.Element);
end Get_Is_Control;
--------------------
-- Set_Is_Control --
--------------------
overriding procedure Set_Is_Control
(Self : not null access UML_Output_Pin_Proxy;
To : Boolean) is
begin
AMF.Internals.Tables.UML_Attributes.Internal_Set_Is_Control
(Self.Element, To);
end Set_Is_Control;
------------------
-- Get_In_State --
------------------
overriding function Get_In_State
(Self : not null access constant UML_Output_Pin_Proxy)
return AMF.UML.States.Collections.Set_Of_UML_State is
begin
return
AMF.UML.States.Collections.Wrap
(AMF.Internals.Element_Collections.Wrap
(AMF.Internals.Tables.UML_Attributes.Internal_Get_In_State
(Self.Element)));
end Get_In_State;
-------------------------
-- Get_Is_Control_Type --
-------------------------
overriding function Get_Is_Control_Type
(Self : not null access constant UML_Output_Pin_Proxy)
return Boolean is
begin
return
AMF.Internals.Tables.UML_Attributes.Internal_Get_Is_Control_Type
(Self.Element);
end Get_Is_Control_Type;
-------------------------
-- Set_Is_Control_Type --
-------------------------
overriding procedure Set_Is_Control_Type
(Self : not null access UML_Output_Pin_Proxy;
To : Boolean) is
begin
AMF.Internals.Tables.UML_Attributes.Internal_Set_Is_Control_Type
(Self.Element, To);
end Set_Is_Control_Type;
------------------
-- Get_Ordering --
------------------
overriding function Get_Ordering
(Self : not null access constant UML_Output_Pin_Proxy)
return AMF.UML.UML_Object_Node_Ordering_Kind is
begin
return
AMF.Internals.Tables.UML_Attributes.Internal_Get_Ordering
(Self.Element);
end Get_Ordering;
------------------
-- Set_Ordering --
------------------
overriding procedure Set_Ordering
(Self : not null access UML_Output_Pin_Proxy;
To : AMF.UML.UML_Object_Node_Ordering_Kind) is
begin
AMF.Internals.Tables.UML_Attributes.Internal_Set_Ordering
(Self.Element, To);
end Set_Ordering;
-------------------
-- Get_Selection --
-------------------
overriding function Get_Selection
(Self : not null access constant UML_Output_Pin_Proxy)
return AMF.UML.Behaviors.UML_Behavior_Access is
begin
return
AMF.UML.Behaviors.UML_Behavior_Access
(AMF.Internals.Helpers.To_Element
(AMF.Internals.Tables.UML_Attributes.Internal_Get_Selection
(Self.Element)));
end Get_Selection;
-------------------
-- Set_Selection --
-------------------
overriding procedure Set_Selection
(Self : not null access UML_Output_Pin_Proxy;
To : AMF.UML.Behaviors.UML_Behavior_Access) is
begin
AMF.Internals.Tables.UML_Attributes.Internal_Set_Selection
(Self.Element,
AMF.Internals.Helpers.To_Element
(AMF.Elements.Element_Access (To)));
end Set_Selection;
---------------------
-- Get_Upper_Bound --
---------------------
overriding function Get_Upper_Bound
(Self : not null access constant UML_Output_Pin_Proxy)
return AMF.UML.Value_Specifications.UML_Value_Specification_Access is
begin
return
AMF.UML.Value_Specifications.UML_Value_Specification_Access
(AMF.Internals.Helpers.To_Element
(AMF.Internals.Tables.UML_Attributes.Internal_Get_Upper_Bound
(Self.Element)));
end Get_Upper_Bound;
---------------------
-- Set_Upper_Bound --
---------------------
overriding procedure Set_Upper_Bound
(Self : not null access UML_Output_Pin_Proxy;
To : AMF.UML.Value_Specifications.UML_Value_Specification_Access) is
begin
AMF.Internals.Tables.UML_Attributes.Internal_Set_Upper_Bound
(Self.Element,
AMF.Internals.Helpers.To_Element
(AMF.Elements.Element_Access (To)));
end Set_Upper_Bound;
------------------
-- Get_Activity --
------------------
overriding function Get_Activity
(Self : not null access constant UML_Output_Pin_Proxy)
return AMF.UML.Activities.UML_Activity_Access is
begin
return
AMF.UML.Activities.UML_Activity_Access
(AMF.Internals.Helpers.To_Element
(AMF.Internals.Tables.UML_Attributes.Internal_Get_Activity
(Self.Element)));
end Get_Activity;
------------------
-- Set_Activity --
------------------
overriding procedure Set_Activity
(Self : not null access UML_Output_Pin_Proxy;
To : AMF.UML.Activities.UML_Activity_Access) is
begin
AMF.Internals.Tables.UML_Attributes.Internal_Set_Activity
(Self.Element,
AMF.Internals.Helpers.To_Element
(AMF.Elements.Element_Access (To)));
end Set_Activity;
------------------
-- Get_In_Group --
------------------
overriding function Get_In_Group
(Self : not null access constant UML_Output_Pin_Proxy)
return AMF.UML.Activity_Groups.Collections.Set_Of_UML_Activity_Group is
begin
return
AMF.UML.Activity_Groups.Collections.Wrap
(AMF.Internals.Element_Collections.Wrap
(AMF.Internals.Tables.UML_Attributes.Internal_Get_In_Group
(Self.Element)));
end Get_In_Group;
---------------------------------
-- Get_In_Interruptible_Region --
---------------------------------
overriding function Get_In_Interruptible_Region
(Self : not null access constant UML_Output_Pin_Proxy)
return AMF.UML.Interruptible_Activity_Regions.Collections.Set_Of_UML_Interruptible_Activity_Region is
begin
return
AMF.UML.Interruptible_Activity_Regions.Collections.Wrap
(AMF.Internals.Element_Collections.Wrap
(AMF.Internals.Tables.UML_Attributes.Internal_Get_In_Interruptible_Region
(Self.Element)));
end Get_In_Interruptible_Region;
----------------------
-- Get_In_Partition --
----------------------
overriding function Get_In_Partition
(Self : not null access constant UML_Output_Pin_Proxy)
return AMF.UML.Activity_Partitions.Collections.Set_Of_UML_Activity_Partition is
begin
return
AMF.UML.Activity_Partitions.Collections.Wrap
(AMF.Internals.Element_Collections.Wrap
(AMF.Internals.Tables.UML_Attributes.Internal_Get_In_Partition
(Self.Element)));
end Get_In_Partition;
----------------------------
-- Get_In_Structured_Node --
----------------------------
overriding function Get_In_Structured_Node
(Self : not null access constant UML_Output_Pin_Proxy)
return AMF.UML.Structured_Activity_Nodes.UML_Structured_Activity_Node_Access is
begin
return
AMF.UML.Structured_Activity_Nodes.UML_Structured_Activity_Node_Access
(AMF.Internals.Helpers.To_Element
(AMF.Internals.Tables.UML_Attributes.Internal_Get_In_Structured_Node
(Self.Element)));
end Get_In_Structured_Node;
----------------------------
-- Set_In_Structured_Node --
----------------------------
overriding procedure Set_In_Structured_Node
(Self : not null access UML_Output_Pin_Proxy;
To : AMF.UML.Structured_Activity_Nodes.UML_Structured_Activity_Node_Access) is
begin
AMF.Internals.Tables.UML_Attributes.Internal_Set_In_Structured_Node
(Self.Element,
AMF.Internals.Helpers.To_Element
(AMF.Elements.Element_Access (To)));
end Set_In_Structured_Node;
------------------
-- Get_Incoming --
------------------
overriding function Get_Incoming
(Self : not null access constant UML_Output_Pin_Proxy)
return AMF.UML.Activity_Edges.Collections.Set_Of_UML_Activity_Edge is
begin
return
AMF.UML.Activity_Edges.Collections.Wrap
(AMF.Internals.Element_Collections.Wrap
(AMF.Internals.Tables.UML_Attributes.Internal_Get_Incoming
(Self.Element)));
end Get_Incoming;
------------------
-- Get_Outgoing --
------------------
overriding function Get_Outgoing
(Self : not null access constant UML_Output_Pin_Proxy)
return AMF.UML.Activity_Edges.Collections.Set_Of_UML_Activity_Edge is
begin
return
AMF.UML.Activity_Edges.Collections.Wrap
(AMF.Internals.Element_Collections.Wrap
(AMF.Internals.Tables.UML_Attributes.Internal_Get_Outgoing
(Self.Element)));
end Get_Outgoing;
------------------------
-- Get_Redefined_Node --
------------------------
overriding function Get_Redefined_Node
(Self : not null access constant UML_Output_Pin_Proxy)
return AMF.UML.Activity_Nodes.Collections.Set_Of_UML_Activity_Node is
begin
return
AMF.UML.Activity_Nodes.Collections.Wrap
(AMF.Internals.Element_Collections.Wrap
(AMF.Internals.Tables.UML_Attributes.Internal_Get_Redefined_Node
(Self.Element)));
end Get_Redefined_Node;
-----------------
-- Get_Is_Leaf --
-----------------
overriding function Get_Is_Leaf
(Self : not null access constant UML_Output_Pin_Proxy)
return Boolean is
begin
return
AMF.Internals.Tables.UML_Attributes.Internal_Get_Is_Leaf
(Self.Element);
end Get_Is_Leaf;
-----------------
-- Set_Is_Leaf --
-----------------
overriding procedure Set_Is_Leaf
(Self : not null access UML_Output_Pin_Proxy;
To : Boolean) is
begin
AMF.Internals.Tables.UML_Attributes.Internal_Set_Is_Leaf
(Self.Element, To);
end Set_Is_Leaf;
---------------------------
-- Get_Redefined_Element --
---------------------------
overriding function Get_Redefined_Element
(Self : not null access constant UML_Output_Pin_Proxy)
return AMF.UML.Redefinable_Elements.Collections.Set_Of_UML_Redefinable_Element is
begin
return
AMF.UML.Redefinable_Elements.Collections.Wrap
(AMF.Internals.Element_Collections.Wrap
(AMF.Internals.Tables.UML_Attributes.Internal_Get_Redefined_Element
(Self.Element)));
end Get_Redefined_Element;
------------------------------
-- Get_Redefinition_Context --
------------------------------
overriding function Get_Redefinition_Context
(Self : not null access constant UML_Output_Pin_Proxy)
return AMF.UML.Classifiers.Collections.Set_Of_UML_Classifier is
begin
return
AMF.UML.Classifiers.Collections.Wrap
(AMF.Internals.Element_Collections.Wrap
(AMF.Internals.Tables.UML_Attributes.Internal_Get_Redefinition_Context
(Self.Element)));
end Get_Redefinition_Context;
---------------------------
-- Get_Client_Dependency --
---------------------------
overriding function Get_Client_Dependency
(Self : not null access constant UML_Output_Pin_Proxy)
return AMF.UML.Dependencies.Collections.Set_Of_UML_Dependency is
begin
return
AMF.UML.Dependencies.Collections.Wrap
(AMF.Internals.Element_Collections.Wrap
(AMF.Internals.Tables.UML_Attributes.Internal_Get_Client_Dependency
(Self.Element)));
end Get_Client_Dependency;
-------------------------
-- Get_Name_Expression --
-------------------------
overriding function Get_Name_Expression
(Self : not null access constant UML_Output_Pin_Proxy)
return AMF.UML.String_Expressions.UML_String_Expression_Access is
begin
return
AMF.UML.String_Expressions.UML_String_Expression_Access
(AMF.Internals.Helpers.To_Element
(AMF.Internals.Tables.UML_Attributes.Internal_Get_Name_Expression
(Self.Element)));
end Get_Name_Expression;
-------------------------
-- Set_Name_Expression --
-------------------------
overriding procedure Set_Name_Expression
(Self : not null access UML_Output_Pin_Proxy;
To : AMF.UML.String_Expressions.UML_String_Expression_Access) is
begin
AMF.Internals.Tables.UML_Attributes.Internal_Set_Name_Expression
(Self.Element,
AMF.Internals.Helpers.To_Element
(AMF.Elements.Element_Access (To)));
end Set_Name_Expression;
-------------------
-- Get_Namespace --
-------------------
overriding function Get_Namespace
(Self : not null access constant UML_Output_Pin_Proxy)
return AMF.UML.Namespaces.UML_Namespace_Access is
begin
return
AMF.UML.Namespaces.UML_Namespace_Access
(AMF.Internals.Helpers.To_Element
(AMF.Internals.Tables.UML_Attributes.Internal_Get_Namespace
(Self.Element)));
end Get_Namespace;
------------------------
-- Get_Qualified_Name --
------------------------
overriding function Get_Qualified_Name
(Self : not null access constant UML_Output_Pin_Proxy)
return AMF.Optional_String is
begin
declare
use type Matreshka.Internals.Strings.Shared_String_Access;
Aux : constant Matreshka.Internals.Strings.Shared_String_Access
:= AMF.Internals.Tables.UML_Attributes.Internal_Get_Qualified_Name (Self.Element);
begin
if Aux = null then
return (Is_Empty => True);
else
return (False, League.Strings.Internals.Create (Aux));
end if;
end;
end Get_Qualified_Name;
--------------
-- Get_Type --
--------------
overriding function Get_Type
(Self : not null access constant UML_Output_Pin_Proxy)
return AMF.UML.Types.UML_Type_Access is
begin
return
AMF.UML.Types.UML_Type_Access
(AMF.Internals.Helpers.To_Element
(AMF.Internals.Tables.UML_Attributes.Internal_Get_Type
(Self.Element)));
end Get_Type;
--------------
-- Set_Type --
--------------
overriding procedure Set_Type
(Self : not null access UML_Output_Pin_Proxy;
To : AMF.UML.Types.UML_Type_Access) is
begin
AMF.Internals.Tables.UML_Attributes.Internal_Set_Type
(Self.Element,
AMF.Internals.Helpers.To_Element
(AMF.Elements.Element_Access (To)));
end Set_Type;
------------------------
-- Is_Consistent_With --
------------------------
overriding function Is_Consistent_With
(Self : not null access constant UML_Output_Pin_Proxy;
Redefinee : AMF.UML.Redefinable_Elements.UML_Redefinable_Element_Access)
return Boolean is
begin
-- Generated stub: replace with real body!
pragma Compile_Time_Warning (Standard.True, "Is_Consistent_With unimplemented");
raise Program_Error with "Unimplemented procedure UML_Output_Pin_Proxy.Is_Consistent_With";
return Is_Consistent_With (Self, Redefinee);
end Is_Consistent_With;
-----------------------------------
-- Is_Redefinition_Context_Valid --
-----------------------------------
overriding function Is_Redefinition_Context_Valid
(Self : not null access constant UML_Output_Pin_Proxy;
Redefined : AMF.UML.Redefinable_Elements.UML_Redefinable_Element_Access)
return Boolean is
begin
-- Generated stub: replace with real body!
pragma Compile_Time_Warning (Standard.True, "Is_Redefinition_Context_Valid unimplemented");
raise Program_Error with "Unimplemented procedure UML_Output_Pin_Proxy.Is_Redefinition_Context_Valid";
return Is_Redefinition_Context_Valid (Self, Redefined);
end Is_Redefinition_Context_Valid;
-------------------------
-- All_Owning_Packages --
-------------------------
overriding function All_Owning_Packages
(Self : not null access constant UML_Output_Pin_Proxy)
return AMF.UML.Packages.Collections.Set_Of_UML_Package is
begin
-- Generated stub: replace with real body!
pragma Compile_Time_Warning (Standard.True, "All_Owning_Packages unimplemented");
raise Program_Error with "Unimplemented procedure UML_Output_Pin_Proxy.All_Owning_Packages";
return All_Owning_Packages (Self);
end All_Owning_Packages;
-----------------------------
-- Is_Distinguishable_From --
-----------------------------
overriding function Is_Distinguishable_From
(Self : not null access constant UML_Output_Pin_Proxy;
N : AMF.UML.Named_Elements.UML_Named_Element_Access;
Ns : AMF.UML.Namespaces.UML_Namespace_Access)
return Boolean is
begin
-- Generated stub: replace with real body!
pragma Compile_Time_Warning (Standard.True, "Is_Distinguishable_From unimplemented");
raise Program_Error with "Unimplemented procedure UML_Output_Pin_Proxy.Is_Distinguishable_From";
return Is_Distinguishable_From (Self, N, Ns);
end Is_Distinguishable_From;
---------------
-- Namespace --
---------------
overriding function Namespace
(Self : not null access constant UML_Output_Pin_Proxy)
return AMF.UML.Namespaces.UML_Namespace_Access is
begin
-- Generated stub: replace with real body!
pragma Compile_Time_Warning (Standard.True, "Namespace unimplemented");
raise Program_Error with "Unimplemented procedure UML_Output_Pin_Proxy.Namespace";
return Namespace (Self);
end Namespace;
---------------------
-- Compatible_With --
---------------------
overriding function Compatible_With
(Self : not null access constant UML_Output_Pin_Proxy;
Other : AMF.UML.Multiplicity_Elements.UML_Multiplicity_Element_Access)
return Boolean is
begin
-- Generated stub: replace with real body!
pragma Compile_Time_Warning (Standard.True, "Compatible_With unimplemented");
raise Program_Error with "Unimplemented procedure UML_Output_Pin_Proxy.Compatible_With";
return Compatible_With (Self, Other);
end Compatible_With;
--------------------------
-- Includes_Cardinality --
--------------------------
overriding function Includes_Cardinality
(Self : not null access constant UML_Output_Pin_Proxy;
C : Integer)
return Boolean is
begin
-- Generated stub: replace with real body!
pragma Compile_Time_Warning (Standard.True, "Includes_Cardinality unimplemented");
raise Program_Error with "Unimplemented procedure UML_Output_Pin_Proxy.Includes_Cardinality";
return Includes_Cardinality (Self, C);
end Includes_Cardinality;
---------------------------
-- Includes_Multiplicity --
---------------------------
overriding function Includes_Multiplicity
(Self : not null access constant UML_Output_Pin_Proxy;
M : AMF.UML.Multiplicity_Elements.UML_Multiplicity_Element_Access)
return Boolean is
begin
-- Generated stub: replace with real body!
pragma Compile_Time_Warning (Standard.True, "Includes_Multiplicity unimplemented");
raise Program_Error with "Unimplemented procedure UML_Output_Pin_Proxy.Includes_Multiplicity";
return Includes_Multiplicity (Self, M);
end Includes_Multiplicity;
---------
-- Iss --
---------
overriding function Iss
(Self : not null access constant UML_Output_Pin_Proxy;
Lowerbound : Integer;
Upperbound : Integer)
return Boolean is
begin
-- Generated stub: replace with real body!
pragma Compile_Time_Warning (Standard.True, "Iss unimplemented");
raise Program_Error with "Unimplemented procedure UML_Output_Pin_Proxy.Iss";
return Iss (Self, Lowerbound, Upperbound);
end Iss;
end AMF.Internals.UML_Output_Pins;
|
AdaCore/libadalang | Ada | 504 | adb | procedure Testpredsucc is
type A is range 1 .. 200;
type B is range A'Succ (A'First) .. A'Pred (A'Last);
--% node.find(lal.BinOp).f_left.p_eval_as_int
--% node.find(lal.BinOp).f_right.p_eval_as_int
type En is (C, D, E, F);
Inst : constant En := En'Succ (C);
--% node.f_default_expr.p_eval_as_int
Inst : constant En := En'Succ (F);
--% node.f_default_expr.p_eval_as_int
Inst2 : constant En := C;
--% node.f_default_expr.p_eval_as_int
begin
null;
end Testpredsucc;
|
tum-ei-rcs/StratoX | Ada | 15,815 | ads | -- This spec has been automatically generated from STM32F40x.svd
pragma Restrictions (No_Elaboration_Code);
pragma Ada_2012;
with HAL;
with System;
package STM32_SVD.USART is
pragma Preelaborate;
---------------
-- Registers --
---------------
-----------------
-- SR_Register --
-----------------
-- Status register
type SR_Register is record
-- Read-only. Parity error
PE : Boolean := False;
-- Read-only. Framing error
FE : Boolean := False;
-- Read-only. Noise detected flag
NF : Boolean := False;
-- Read-only. Overrun error
ORE : Boolean := False;
-- Read-only. IDLE line detected
IDLE : Boolean := False;
-- Read data register not empty
RXNE : Boolean := False;
-- Transmission complete
TC : Boolean := False;
-- Read-only. Transmit data register empty
TXE : Boolean := False;
-- LIN break detection flag
LBD : Boolean := False;
-- CTS flag
CTS : Boolean := False;
-- unspecified
Reserved_10_31 : HAL.UInt22 := 16#3000#;
end record
with Volatile_Full_Access, Size => 32,
Bit_Order => System.Low_Order_First;
for SR_Register use record
PE at 0 range 0 .. 0;
FE at 0 range 1 .. 1;
NF at 0 range 2 .. 2;
ORE at 0 range 3 .. 3;
IDLE at 0 range 4 .. 4;
RXNE at 0 range 5 .. 5;
TC at 0 range 6 .. 6;
TXE at 0 range 7 .. 7;
LBD at 0 range 8 .. 8;
CTS at 0 range 9 .. 9;
Reserved_10_31 at 0 range 10 .. 31;
end record;
-----------------
-- DR_Register --
-----------------
subtype DR_DR_Field is HAL.UInt9;
-- Data register
type DR_Register is record
-- Data value
DR : DR_DR_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 DR_Register use record
DR at 0 range 0 .. 8;
Reserved_9_31 at 0 range 9 .. 31;
end record;
------------------
-- BRR_Register --
------------------
subtype BRR_DIV_Fraction_Field is HAL.UInt4;
subtype BRR_DIV_Mantissa_Field is HAL.UInt12;
-- Baud rate register
type BRR_Register is record
-- fraction of USARTDIV
DIV_Fraction : BRR_DIV_Fraction_Field := 16#0#;
-- mantissa of USARTDIV
DIV_Mantissa : BRR_DIV_Mantissa_Field := 16#0#;
-- unspecified
Reserved_16_31 : HAL.Short := 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;
------------------
-- CR1_Register --
------------------
-- Control register 1
type CR1_Register is record
-- Send break
SBK : Boolean := False;
-- Receiver wakeup
RWU : 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;
-- TXE interrupt enable
TXEIE : Boolean := False;
-- PE interrupt enable
PEIE : Boolean := False;
-- Parity selection
PS : Boolean := False;
-- Parity control enable
PCE : Boolean := False;
-- Wakeup method
WAKE : Boolean := False;
-- Word length
M : Boolean := False;
-- USART enable
UE : Boolean := False;
-- unspecified
Reserved_14_14 : HAL.Bit := 16#0#;
-- Oversampling mode
OVER8 : Boolean := False;
-- unspecified
Reserved_16_31 : HAL.Short := 16#0#;
end record
with Volatile_Full_Access, Size => 32,
Bit_Order => System.Low_Order_First;
for CR1_Register use record
SBK at 0 range 0 .. 0;
RWU at 0 range 1 .. 1;
RE at 0 range 2 .. 2;
TE at 0 range 3 .. 3;
IDLEIE at 0 range 4 .. 4;
RXNEIE at 0 range 5 .. 5;
TCIE at 0 range 6 .. 6;
TXEIE at 0 range 7 .. 7;
PEIE at 0 range 8 .. 8;
PS at 0 range 9 .. 9;
PCE at 0 range 10 .. 10;
WAKE at 0 range 11 .. 11;
M at 0 range 12 .. 12;
UE at 0 range 13 .. 13;
Reserved_14_14 at 0 range 14 .. 14;
OVER8 at 0 range 15 .. 15;
Reserved_16_31 at 0 range 16 .. 31;
end record;
------------------
-- CR2_Register --
------------------
subtype CR2_ADD_Field is HAL.UInt4;
subtype CR2_STOP_Field is HAL.UInt2;
-- Control register 2
type CR2_Register is record
-- Address of the USART node
ADD : CR2_ADD_Field := 16#0#;
-- unspecified
Reserved_4_4 : HAL.Bit := 16#0#;
-- 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;
-- unspecified
Reserved_15_31 : HAL.UInt17 := 16#0#;
end record
with Volatile_Full_Access, Size => 32,
Bit_Order => System.Low_Order_First;
for CR2_Register use record
ADD at 0 range 0 .. 3;
Reserved_4_4 at 0 range 4 .. 4;
LBDL at 0 range 5 .. 5;
LBDIE at 0 range 6 .. 6;
Reserved_7_7 at 0 range 7 .. 7;
LBCL at 0 range 8 .. 8;
CPHA at 0 range 9 .. 9;
CPOL at 0 range 10 .. 10;
CLKEN at 0 range 11 .. 11;
STOP at 0 range 12 .. 13;
LINEN at 0 range 14 .. 14;
Reserved_15_31 at 0 range 15 .. 31;
end record;
------------------
-- CR3_Register --
------------------
-- Control register 3
type CR3_Register is record
-- Error interrupt enable
EIE : Boolean := False;
-- IrDA mode enable
IREN : Boolean := False;
-- IrDA 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;
-- unspecified
Reserved_12_31 : HAL.UInt20 := 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;
Reserved_12_31 at 0 range 12 .. 31;
end record;
-------------------
-- GTPR_Register --
-------------------
subtype GTPR_PSC_Field is HAL.Byte;
subtype GTPR_GT_Field is HAL.Byte;
-- Guard time and prescaler register
type GTPR_Register is record
-- Prescaler value
PSC : GTPR_PSC_Field := 16#0#;
-- Guard time value
GT : GTPR_GT_Field := 16#0#;
-- unspecified
Reserved_16_31 : HAL.Short := 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;
-----------------
-- SR_Register --
-----------------
-- Status register
type SR_Register_1 is record
-- Read-only. Parity error
PE : Boolean := False;
-- Read-only. Framing error
FE : Boolean := False;
-- Read-only. Noise detected flag
NF : Boolean := False;
-- Read-only. Overrun error
ORE : Boolean := False;
-- Read-only. IDLE line detected
IDLE : Boolean := False;
-- Read data register not empty
RXNE : Boolean := False;
-- Transmission complete
TC : Boolean := False;
-- Read-only. Transmit data register empty
TXE : Boolean := False;
-- LIN break detection flag
LBD : Boolean := False;
-- unspecified
Reserved_9_31 : HAL.UInt23 := 16#6000#;
end record
with Volatile_Full_Access, Size => 32,
Bit_Order => System.Low_Order_First;
for SR_Register_1 use record
PE at 0 range 0 .. 0;
FE at 0 range 1 .. 1;
NF at 0 range 2 .. 2;
ORE at 0 range 3 .. 3;
IDLE at 0 range 4 .. 4;
RXNE at 0 range 5 .. 5;
TC at 0 range 6 .. 6;
TXE at 0 range 7 .. 7;
LBD at 0 range 8 .. 8;
Reserved_9_31 at 0 range 9 .. 31;
end record;
------------------
-- CR2_Register --
------------------
-- Control register 2
type CR2_Register_1 is record
-- Address of the USART node
ADD : CR2_ADD_Field := 16#0#;
-- unspecified
Reserved_4_4 : HAL.Bit := 16#0#;
-- lin break detection length
LBDL : Boolean := False;
-- LIN break detection interrupt enable
LBDIE : Boolean := False;
-- unspecified
Reserved_7_11 : HAL.UInt5 := 16#0#;
-- STOP bits
STOP : CR2_STOP_Field := 16#0#;
-- LIN mode enable
LINEN : Boolean := False;
-- unspecified
Reserved_15_31 : HAL.UInt17 := 16#0#;
end record
with Volatile_Full_Access, Size => 32,
Bit_Order => System.Low_Order_First;
for CR2_Register_1 use record
ADD at 0 range 0 .. 3;
Reserved_4_4 at 0 range 4 .. 4;
LBDL at 0 range 5 .. 5;
LBDIE at 0 range 6 .. 6;
Reserved_7_11 at 0 range 7 .. 11;
STOP at 0 range 12 .. 13;
LINEN at 0 range 14 .. 14;
Reserved_15_31 at 0 range 15 .. 31;
end record;
------------------
-- CR3_Register --
------------------
-- Control register 3
type CR3_Register_1 is record
-- Error interrupt enable
EIE : Boolean := False;
-- IrDA mode enable
IREN : Boolean := False;
-- IrDA low-power
IRLP : Boolean := False;
-- Half-duplex selection
HDSEL : Boolean := False;
-- unspecified
Reserved_4_5 : HAL.UInt2 := 16#0#;
-- DMA enable receiver
DMAR : Boolean := False;
-- DMA enable transmitter
DMAT : Boolean := False;
-- unspecified
Reserved_8_10 : HAL.UInt3 := 16#0#;
-- One sample bit method enable
ONEBIT : Boolean := False;
-- unspecified
Reserved_12_31 : HAL.UInt20 := 16#0#;
end record
with Volatile_Full_Access, Size => 32,
Bit_Order => System.Low_Order_First;
for CR3_Register_1 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;
Reserved_4_5 at 0 range 4 .. 5;
DMAR at 0 range 6 .. 6;
DMAT at 0 range 7 .. 7;
Reserved_8_10 at 0 range 8 .. 10;
ONEBIT at 0 range 11 .. 11;
Reserved_12_31 at 0 range 12 .. 31;
end record;
-----------------
-- Peripherals --
-----------------
-- Universal synchronous asynchronous receiver transmitter
type USART2_Peripheral is record
-- Status register
SR : SR_Register;
-- Data register
DR : DR_Register;
-- Baud rate register
BRR : BRR_Register;
-- Control register 1
CR1 : CR1_Register;
-- Control register 2
CR2 : CR2_Register;
-- Control register 3
CR3 : CR3_Register;
-- Guard time and prescaler register
GTPR : GTPR_Register;
end record
with Volatile;
for USART2_Peripheral use record
SR at 0 range 0 .. 31;
DR at 4 range 0 .. 31;
BRR at 8 range 0 .. 31;
CR1 at 12 range 0 .. 31;
CR2 at 16 range 0 .. 31;
CR3 at 20 range 0 .. 31;
GTPR at 24 range 0 .. 31;
end record;
-- Universal synchronous asynchronous receiver transmitter
USART2_Periph : aliased USART2_Peripheral
with Import, Address => USART2_Base;
-- Universal synchronous asynchronous receiver transmitter
USART3_Periph : aliased USART2_Peripheral
with Import, Address => USART3_Base;
-- Universal synchronous asynchronous receiver transmitter
USART1_Periph : aliased USART2_Peripheral
with Import, Address => USART1_Base;
-- Universal synchronous asynchronous receiver transmitter
USART6_Periph : aliased USART2_Peripheral
with Import, Address => USART6_Base;
-- Universal synchronous asynchronous receiver transmitter
type UART4_Peripheral is record
-- Status register
SR : SR_Register_1;
-- Data register
DR : DR_Register;
-- Baud rate register
BRR : BRR_Register;
-- Control register 1
CR1 : CR1_Register;
-- Control register 2
CR2 : CR2_Register_1;
-- Control register 3
CR3 : CR3_Register_1;
end record
with Volatile;
for UART4_Peripheral use record
SR at 0 range 0 .. 31;
DR at 4 range 0 .. 31;
BRR at 8 range 0 .. 31;
CR1 at 12 range 0 .. 31;
CR2 at 16 range 0 .. 31;
CR3 at 20 range 0 .. 31;
end record;
-- Universal synchronous asynchronous receiver transmitter
UART4_Periph : aliased UART4_Peripheral
with Import, Address => UART4_Base;
-- Universal synchronous asynchronous receiver transmitter
UART5_Periph : aliased UART4_Peripheral
with Import, Address => UART5_Base;
end STM32_SVD.USART;
|
stcarrez/ada-wiki | Ada | 6,703 | adb | -----------------------------------------------------------------------
-- wiki-streams-html-stream -- Generic Wiki HTML output stream
-- Copyright (C) 2016, 2020, 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 Wiki.Helpers;
package body Wiki.Streams.Html.Stream is
-- Close the current XML entity if an entity was started
procedure Close_Current (Stream : in out Html_Output_Stream'Class);
-- Write the string to the stream.
procedure Write_String (Stream : in out Html_Output_Stream'Class;
Content : in String);
-- ------------------------------
-- Set the indentation level for HTML output stream.
-- ------------------------------
overriding
procedure Set_Indent_Level (Writer : in out Html_Output_Stream;
Indent : in Natural) is
begin
Writer.Indent_Level := Indent;
end Set_Indent_Level;
-- ------------------------------
-- Write an optional newline or space.
-- ------------------------------
overriding
procedure Newline (Writer : in out Html_Output_Stream) is
begin
if Writer.Indent_Level > 0 and then Writer.Text_Length > 0 then
Writer.Write (Wiki.Helpers.LF);
Writer.Empty_Line := True;
end if;
Writer.Text_Length := 0;
end Newline;
-- ------------------------------
-- Close the current XML entity if an entity was started
-- ------------------------------
procedure Close_Current (Stream : in out Html_Output_Stream'Class) is
begin
if Stream.Close_Start then
Stream.Write ('>');
Stream.Close_Start := False;
Stream.Empty_Line := False;
end if;
end Close_Current;
-- ------------------------------
-- Write the string to the stream.
-- ------------------------------
procedure Write_String (Stream : in out Html_Output_Stream'Class;
Content : in String) is
begin
for I in Content'Range loop
Stream.Write (Wiki.Strings.To_WChar (Content (I)));
end loop;
if Content'Length > 0 then
Stream.Text_Length := Stream.Text_Length + Content'Length;
Stream.Empty_Line := False;
end if;
end Write_String;
-- ------------------------------
-- Write an XML attribute within an XML element.
-- The attribute value is escaped according to the XML escape rules.
-- ------------------------------
overriding
procedure Write_Wide_Attribute (Stream : in out Html_Output_Stream;
Name : in String;
Content : in Wiki.Strings.UString) is
begin
if Stream.Close_Start then
Html.Write_Escape_Attribute (Stream, Name, Wiki.Strings.To_WString (Content));
end if;
end Write_Wide_Attribute;
-- ------------------------------
-- Write an XML attribute within an XML element.
-- The attribute value is escaped according to the XML escape rules.
-- ------------------------------
overriding
procedure Write_Wide_Attribute (Stream : in out Html_Output_Stream;
Name : in String;
Content : in Wide_Wide_String) is
begin
if Stream.Close_Start then
Stream.Write_Escape_Attribute (Name, Content);
end if;
end Write_Wide_Attribute;
-- ------------------------------
-- Start an XML element with the given name.
-- ------------------------------
overriding
procedure Start_Element (Stream : in out Html_Output_Stream;
Name : in String) is
begin
Close_Current (Stream);
if Stream.Indent_Pos > 1 then
if not Stream.Empty_Line then
Stream.Write (Helpers.LF);
end if;
for I in 1 .. Stream.Indent_Pos loop
Stream.Write (' ');
end loop;
end if;
Stream.Write ('<');
Stream.Write_String (Name);
Stream.Close_Start := True;
Stream.Text_Length := 0;
Stream.Empty_Line := False;
Stream.Indent_Pos := Stream.Indent_Pos + Stream.Indent_Level;
end Start_Element;
-- ------------------------------
-- Closes an XML element of the given name.
-- ------------------------------
overriding
procedure End_Element (Stream : in out Html_Output_Stream;
Name : in String) is
begin
if Stream.Indent_Pos >= Stream.Indent_Level then
Stream.Indent_Pos := Stream.Indent_Pos - Stream.Indent_Level;
end if;
if Stream.Close_Start then
Stream.Write (" />");
Stream.Close_Start := False;
else
Close_Current (Stream);
if Stream.Text_Length = 0 then
if not Stream.Empty_Line and then Stream.Indent_Level > 0 then
Stream.Write (Wiki.Helpers.LF);
end if;
if Stream.Indent_Pos > 1 then
Stream.Write (Helpers.LF);
for I in 1 .. Stream.Indent_Pos loop
Stream.Write (' ');
end loop;
end if;
end if;
Stream.Write ("</");
Stream.Write_String (Name);
Stream.Write ('>');
end if;
if Stream.Indent_Level > 0 then
Stream.Write (Wiki.Helpers.LF);
Stream.Empty_Line := True;
end if;
Stream.Text_Length := 0;
end End_Element;
-- ------------------------------
-- Write a text escaping any character as necessary.
-- ------------------------------
overriding
procedure Write_Wide_Text (Stream : in out Html_Output_Stream;
Content : in Wiki.Strings.WString) is
begin
Close_Current (Stream);
Stream.Write_Escape (Content);
if Content'Length > 0 then
Stream.Text_Length := Stream.Text_Length + Content'Length;
Stream.Empty_Line := False;
else
Stream.Write (' ');
end if;
end Write_Wide_Text;
end Wiki.Streams.Html.Stream;
|
AdaCore/Ada_Drivers_Library | Ada | 9,666 | ads | ------------------------------------------------------------------------------
-- --
-- Copyright (C) 2015-2018, AdaCore --
-- --
-- Redistribution and use in source and binary forms, with or without --
-- modification, are permitted provided that the following conditions are --
-- met: --
-- 1. Redistributions of source code must retain the above copyright --
-- notice, this list of conditions and the following disclaimer. --
-- 2. Redistributions in binary form must reproduce the above copyright --
-- notice, this list of conditions and the following disclaimer in --
-- the documentation and/or other materials provided with the --
-- distribution. --
-- 3. Neither the name of the copyright holder nor the names of its --
-- contributors may be used to endorse or promote products derived --
-- from this software without specific prior written permission. --
-- --
-- THIS SOFTWARE IS PROVIDED BY THE COPYRIGHT HOLDERS AND CONTRIBUTORS --
-- "AS IS" AND ANY EXPRESS OR IMPLIED WARRANTIES, INCLUDING, BUT NOT --
-- LIMITED TO, THE IMPLIED WARRANTIES OF MERCHANTABILITY AND FITNESS FOR --
-- A PARTICULAR PURPOSE ARE DISCLAIMED. IN NO EVENT SHALL THE COPYRIGHT --
-- HOLDER OR CONTRIBUTORS BE LIABLE FOR ANY DIRECT, INDIRECT, INCIDENTAL, --
-- SPECIAL, EXEMPLARY, OR CONSEQUENTIAL DAMAGES (INCLUDING, BUT NOT --
-- LIMITED TO, PROCUREMENT OF SUBSTITUTE GOODS OR SERVICES; LOSS OF USE, --
-- DATA, OR PROFITS; OR BUSINESS INTERRUPTION) HOWEVER CAUSED AND ON ANY --
-- THEORY OF LIABILITY, WHETHER IN CONTRACT, STRICT LIABILITY, OR TORT --
-- (INCLUDING NEGLIGENCE OR OTHERWISE) ARISING IN ANY WAY OUT OF THE USE --
-- OF THIS SOFTWARE, EVEN IF ADVISED OF THE POSSIBILITY OF SUCH DAMAGE. --
-- --
------------------------------------------------------------------------------
-- This file provides declarations for devices on the STM32F469 Discovery kits
-- manufactured by ST Microelectronics.
with Ada.Interrupts.Names; use Ada.Interrupts;
with System;
with STM32.Device; use STM32.Device;
with STM32.DMA; use STM32.DMA;
with STM32.DMA.Interrupts; use STM32.DMA.Interrupts;
with STM32.FMC; use STM32.FMC;
with STM32.GPIO; use STM32.GPIO;
with STM32.I2C; use STM32.I2C;
with STM32.SAI; use STM32.SAI;
use STM32; -- for base addresses
with Audio;
with Framebuffer_OTM8009A;
with Touch_Panel_FT6x06;
with SDCard;
package STM32.Board is
pragma Elaborate_Body;
subtype User_LED is GPIO_Point;
Green_LED : User_LED renames PG6;
Orange_LED : User_LED renames PD4;
Red_LED : User_LED renames PD5;
Blue_LED : User_LED renames PK3;
LCH_LED : User_LED renames Red_LED;
All_LEDs : GPIO_Points := Green_LED & Orange_LED & Red_LED & Blue_LED;
procedure Initialize_LEDs;
-- MUST be called prior to any use of the LEDs
procedure Turn_On (This : in out User_LED) renames STM32.GPIO.Set;
procedure Turn_Off (This : in out User_LED) renames STM32.GPIO.Clear;
procedure Toggle (This : in out User_LED) renames STM32.GPIO.Toggle;
procedure All_LEDs_Off with Inline;
procedure All_LEDs_On with Inline;
procedure Toggle_LEDs (These : in out GPIO_Points)
renames STM32.GPIO.Toggle;
-----------
-- SDRAM --
-----------
FMC_D : constant GPIO_Points :=
(PD0, PD1, PD8, PD9, PD10, PD14, PD15,
PE7, PE8, PE9, PE10, PE11, PE12, PE13, PE14, PE15,
PH8, PH9, PH10, PH11, PH12, PH13, PH14, PH15,
PI0, PI1, PI2, PI3, PI6, PI7, PI9, PI10);
FMC_A : constant GPIO_Points :=
(PF0, PF1, PF2, PF3, PF4, PF5,
PF12, PF13, PF14, PF15, PG0, PG1, PG4, PG5);
FMC_SDNWE : GPIO_Point renames PC0;
FMC_SDNRAS : GPIO_Point renames PF11;
FMC_SDNCAS : GPIO_Point renames PG15;
FMC_SDNE0 : GPIO_Point renames PH3;
FMC_SDCKE0 : GPIO_Point renames PH2;
FMC_SDCLK : GPIO_Point renames PG8;
FMC_NBL0 : GPIO_Point renames PE0;
FMC_NBL1 : GPIO_Point renames PE1;
FMC_NBL2 : GPIO_Point renames PI4;
FMC_NBL3 : GPIO_Point renames PI5;
SDRAM_PINS : constant GPIO_Points :=
FMC_A & FMC_D &
FMC_SDNWE & FMC_SDNRAS & FMC_SDNCAS & FMC_SDCLK &
FMC_SDNE0 & FMC_SDCKE0 & FMC_NBL0 & FMC_NBL1 &
FMC_NBL2 & FMC_NBL3;
-- SDRAM CONFIGURATION Parameters
SDRAM_Base : constant := 16#C0000000#;
SDRAM_Size : constant := 16#800000#;
SDRAM_Bank : constant STM32.FMC.FMC_SDRAM_Cmd_Target_Bank :=
STM32.FMC.FMC_Bank1_SDRAM;
SDRAM_Mem_Width : constant STM32.FMC.FMC_SDRAM_Memory_Bus_Width :=
STM32.FMC.FMC_SDMemory_Width_32b;
SDRAM_Row_Bits : constant STM32.FMC.FMC_SDRAM_Row_Address_Bits :=
FMC_RowBits_Number_11b;
SDRAM_CAS_Latency : constant STM32.FMC.FMC_SDRAM_CAS_Latency :=
STM32.FMC.FMC_CAS_Latency_3;
SDRAM_CLOCK_Period : constant STM32.FMC.FMC_SDRAM_Clock_Configuration :=
STM32.FMC.FMC_SDClock_Period_2;
SDRAM_Read_Burst : constant STM32.FMC.FMC_SDRAM_Burst_Read :=
STM32.FMC.FMC_Read_Burst_Single;
SDRAM_Read_Pipe : constant STM32.FMC.FMC_SDRAM_Read_Pipe_Delay :=
STM32.FMC.FMC_ReadPipe_Delay_0;
SDRAM_Refresh_Cnt : constant := 16#0569#;
SDRAM_Min_Delay_In_ns : constant := 70;
---------
-- I2C --
---------
I2C1_SCL : GPIO_Point renames PB8;
I2C1_SDA : GPIO_Point renames PB9;
I2C2_SCL : GPIO_Point renames PH4;
I2C2_SDA : GPIO_Point renames PH5;
procedure Initialize_I2C_GPIO (Port : in out I2C_Port)
with
-- I2C_3 is not accessible on this board
Pre => As_Port_Id (Port) = I2C_Id_1
or else
As_Port_Id (Port) = I2C_Id_2;
--------------------------------
-- Screen/Touch panel devices --
--------------------------------
LCD_Natural_Width : constant := Framebuffer_OTM8009A.LCD_Natural_Width;
LCD_Natural_Height : constant := Framebuffer_OTM8009A.LCD_Natural_Height;
Display : Framebuffer_OTM8009A.Frame_Buffer;
Touch_Panel : Touch_Panel_FT6x06.Touch_Panel;
-----------------
-- Touch Panel --
-----------------
TP_INT : GPIO_Point renames PJ5;
-----------
-- Audio --
-----------
Audio_SAI : SAI_Controller renames SAI_1;
Audio_I2C : STM32.I2C.I2C_Port renames I2C_2;
Audio_I2C_SDA : STM32.GPIO.GPIO_Point renames I2C2_SDA;
Audio_I2C_SCL : STM32.GPIO.GPIO_Point renames I2C2_SCL;
Audio_I2C_AF : constant STM32.GPIO_Alternate_Function := STM32.Device.GPIO_AF_I2C2_4;
-- Audio_INT : GPIO_Point renames PB10;
-- Audio DMA configuration
Audio_DMA : DMA_Controller renames DMA_2;
Audio_Out_DMA_Interrupt : Ada.Interrupts.Interrupt_ID renames
Ada.Interrupts.Names.DMA2_Stream1_Interrupt;
Audio_DMA_Out_Stream : DMA_Stream_Selector renames Stream_1;
Audio_DMA_Out_Channel : DMA_Channel_Selector renames Channel_0;
Audio_Device : aliased Audio.CS43L22_Audio_Device (Audio_I2C'Access);
-----------------
-- User button --
-----------------
User_Button_Point : GPIO_Point renames PA0;
User_Button_Interrupt : constant Interrupt_ID := Names.EXTI0_Interrupt;
procedure Configure_User_Button_GPIO;
-- Configures the GPIO port/pin for the blue user button. Sufficient
-- for polling the button, and necessary for having the button generate
-- interrupts.
------------
-- SDCARD --
------------
SD_Detect_Pin : STM32.GPIO.GPIO_Point renames PG2;
SD_DMA : DMA_Controller renames DMA_2;
SD_DMA_Rx_Stream : DMA_Stream_Selector renames Stream_3;
SD_DMA_Rx_Channel : DMA_Channel_Selector renames Channel_4;
SD_DMA_Tx_Stream : DMA_Stream_Selector renames Stream_6;
SD_DMA_Tx_Channel : DMA_Channel_Selector renames Channel_4;
SD_Pins : constant GPIO_Points :=
(PC8, PC9, PC10, PC11, PC12, PD2);
SD_Pins_AF : constant GPIO_Alternate_Function := GPIO_AF_SDIO_12;
SD_Pins_2 : constant GPIO_Points := (1 .. 0 => <>);
SD_Pins_AF_2 : constant GPIO_Alternate_Function := GPIO_AF_SDIO_12;
SD_Interrupt : Ada.Interrupts.Interrupt_ID renames
Ada.Interrupts.Names.SDIO_Interrupt;
DMA2_Stream3 : aliased DMA_Interrupt_Controller
(DMA_2'Access, Stream_3,
Ada.Interrupts.Names.DMA2_Stream3_Interrupt,
System.Interrupt_Priority'Last);
DMA2_Stream6 : aliased DMA_Interrupt_Controller
(DMA_2'Access, Stream_6,
Ada.Interrupts.Names.DMA2_Stream6_Interrupt,
System.Interrupt_Priority'Last);
SD_Rx_DMA_Int : DMA_Interrupt_Controller renames DMA2_Stream3;
SD_Tx_DMA_Int : DMA_Interrupt_Controller renames DMA2_Stream6;
SDCard_Device : aliased SDCard.SDCard_Controller (SDIO'Access);
end STM32.Board;
|
DrenfongWong/tkm-rpc | Ada | 1,059 | ads | with Tkmrpc.Types;
with Tkmrpc.Operations.Ike;
package Tkmrpc.Response.Ike.Cc_Add_Certificate is
Data_Size : constant := 0;
Padding_Size : constant := Response.Body_Size - Data_Size;
subtype Padding_Range is Natural range 1 .. Padding_Size;
subtype Padding_Type is Types.Byte_Sequence (Padding_Range);
type Response_Type is record
Header : Response.Header_Type;
Padding : Padding_Type;
end record;
for Response_Type use record
Header at 0 range 0 .. (Response.Header_Size * 8) - 1;
Padding at Response.Header_Size + Data_Size range
0 .. (Padding_Size * 8) - 1;
end record;
for Response_Type'Size use Response.Response_Size * 8;
Null_Response : constant Response_Type :=
Response_Type'
(Header =>
Response.Header_Type'(Operation => Operations.Ike.Cc_Add_Certificate,
Result => Results.Invalid_Operation,
Request_Id => 0),
Padding => Padding_Type'(others => 0));
end Tkmrpc.Response.Ike.Cc_Add_Certificate;
|
sbksba/Concurrence-LI330 | Ada | 90 | ads | package ppp is
procedure pointparpoint(x0,y0,x1,y1 : natural; color : string);
end ppp;
|
stcarrez/dynamo | Ada | 90,022 | adb | ------------------------------------------------------------------------------
-- --
-- ASIS-for-GNAT IMPLEMENTATION COMPONENTS --
-- --
-- A S I S . D E F I N I T I O N S --
-- --
-- B o d y --
-- --
-- Copyright (C) 1995-2011, 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). --
-- --
------------------------------------------------------------------------------
with Asis.Declarations; use Asis.Declarations;
with Asis.Elements; use Asis.Elements;
with Asis.Errors; use Asis.Errors;
with Asis.Exceptions; use Asis.Exceptions;
with Asis.Extensions; use Asis.Extensions;
with Asis.Set_Get; use Asis.Set_Get;
with A4G.A_Sem; use A4G.A_Sem;
with A4G.Asis_Tables; use A4G.Asis_Tables;
with A4G.Contt.UT; use A4G.Contt.UT;
with A4G.Mapping; use A4G.Mapping;
with A4G.Norm; use A4G.Norm;
with A4G.Stand; use A4G.Stand;
with A4G.Vcheck; use A4G.Vcheck;
with Atree; use Atree;
with Einfo; use Einfo;
with Namet; use Namet;
with Nlists; use Nlists;
with Sinfo; use Sinfo;
package body Asis.Definitions is
Package_Name : constant String := "Asis.Definitions.";
------------------------------------------------------------------------------
---------------------------
-- ASIS 2005 Draft stuff --
---------------------------
---------------------------------------------
-- Anonymous_Access_To_Object_Subtype_Mark --
---------------------------------------------
function Anonymous_Access_To_Object_Subtype_Mark
(Definition : Asis.Definition)
return Asis.Expression
is
Arg_Kind : constant Internal_Element_Kinds := Int_Kind (Definition);
Arg_Node : Node_Id;
begin
Check_Validity
(Definition, Package_Name & "Anonymous_Access_To_Object_Subtype_Mark");
if not (Arg_Kind = An_Anonymous_Access_To_Variable or else
Arg_Kind = An_Anonymous_Access_To_Constant)
then
Raise_ASIS_Inappropriate_Element
(Diagnosis => Package_Name &
"Anonymous_Access_To_Object_Subtype_Mark",
Wrong_Kind => Arg_Kind);
end if;
Arg_Node := Node (Definition);
return Node_To_Element_New
(Node => Subtype_Mark (Arg_Node),
Starting_Element => Definition);
exception
when ASIS_Inappropriate_Element =>
raise;
when ASIS_Failed =>
if Status_Indicator = Unhandled_Exception_Error then
Add_Call_Information
(Argument => Definition,
Outer_Call => Package_Name &
"Anonymous_Access_To_Object_Subtype_Mark");
end if;
raise;
when Ex : others =>
Report_ASIS_Bug
(Query_Name => Package_Name &
"Anonymous_Access_To_Object_Subtype_Mark",
Ex => Ex,
Arg_Element => Definition);
end Anonymous_Access_To_Object_Subtype_Mark;
-------------------------------
-- Component_Definition_View --
-------------------------------
function Component_Definition_View
(Component_Definition : Asis.Component_Definition)
return Asis.Definition
is
Arg_Kind : constant Internal_Element_Kinds :=
Int_Kind (Component_Definition);
Res_Node : Node_Id;
Result_Kind : Internal_Element_Kinds := Not_An_Element;
begin
Check_Validity
(Component_Definition,
Package_Name & "Component_Definition_View");
if not (Arg_Kind = A_Component_Definition) then
Raise_ASIS_Inappropriate_Element
(Diagnosis => Package_Name & "Component_Definition_View",
Wrong_Kind => Arg_Kind);
end if;
Res_Node := R_Node (Component_Definition);
if Is_Rewrite_Substitution (Res_Node)
or else
Present (Access_Definition (Res_Node))
then
Res_Node := Access_Definition (Original_Node (Res_Node));
else
Result_Kind := A_Subtype_Indication;
Res_Node := Sinfo.Subtype_Indication (Res_Node);
end if;
return Node_To_Element_New
(Node => Res_Node,
Starting_Element => Component_Definition,
Internal_Kind => Result_Kind);
exception
when ASIS_Inappropriate_Element =>
raise;
when ASIS_Failed =>
if Status_Indicator = Unhandled_Exception_Error then
Add_Call_Information
(Argument => Component_Definition,
Outer_Call => Package_Name & "Component_Definition_View");
end if;
raise;
when Ex : others =>
Report_ASIS_Bug
(Query_Name => Package_Name & "Component_Definition_View",
Ex => Ex,
Arg_Element => Component_Definition);
end Component_Definition_View;
-------------------------------
-- Definition_Interface_List --
-------------------------------
function Definition_Interface_List
(Type_Definition : Asis.Definition)
return Asis.Expression_List
is
Arg_Kind : constant Internal_Element_Kinds := Int_Kind (Type_Definition);
Arg_Node : Node_Id;
First_I : Node_Id;
I_Kind : Internal_Element_Kinds;
begin
Check_Validity
(Type_Definition, Package_Name & "Definition_Interface_List");
if not (Arg_Kind = A_Derived_Record_Extension_Definition or else
Arg_Kind = A_Private_Extension_Definition or else
Arg_Kind in Internal_Interface_Kinds or else
Arg_Kind = A_Formal_Derived_Type_Definition or else
Arg_Kind in Internal_Formal_Interface_Kinds)
then
Raise_ASIS_Inappropriate_Element
(Diagnosis => Package_Name & "Definition_Interface_List",
Wrong_Kind => Arg_Kind);
end if;
Arg_Node := Node (Type_Definition);
if Nkind (Arg_Node) = N_Record_Definition
and then
not Interface_Present (Arg_Node)
then
return Nil_Element_List;
elsif Nkind (Arg_Node) = N_Derived_Type_Definition
and then
Interface_Present (Arg_Node)
then
-- The first interface name in the list is represented as
-- Subtype_Indication field in N_Derived_Type_Definition node
First_I := Sinfo.Subtype_Indication (Arg_Node);
if Nkind (First_I) = N_Identifier then
I_Kind := An_Identifier;
else
I_Kind := A_Selected_Component;
end if;
return
Node_To_Element_New
(Node => First_I,
Starting_Element => Type_Definition,
Internal_Kind => I_Kind)
&
N_To_E_List_New (List => Interface_List (Arg_Node),
Starting_Element => Type_Definition);
else
return N_To_E_List_New (List => Interface_List (Arg_Node),
Starting_Element => Type_Definition);
end if;
exception
when ASIS_Inappropriate_Element =>
raise;
when ASIS_Failed =>
if Status_Indicator = Unhandled_Exception_Error then
Add_Call_Information
(Argument => Type_Definition,
Outer_Call => Package_Name & "Definition_Interface_List");
end if;
raise;
when Ex : others =>
Report_ASIS_Bug
(Query_Name => Package_Name & "Definition_Interface_List",
Ex => Ex,
Arg_Element => Type_Definition);
end Definition_Interface_List;
---------------------------
-- ASIS 2012 Draft stuff --
---------------------------
-----------------------
-- Aspect_Definition --
-----------------------
function Aspect_Definition
(Aspect_Specification : Asis.Element)
return Asis.Element
is
Arg_Kind : constant Internal_Element_Kinds :=
Int_Kind (Aspect_Specification);
begin
Check_Validity
(Aspect_Specification, Package_Name & "Aspect_Definition");
if Arg_Kind /= An_Aspect_Specification then
Raise_ASIS_Inappropriate_Element
(Diagnosis => Package_Name & "Aspect_Definition",
Wrong_Kind => Arg_Kind);
end if;
return Node_To_Element_New
(Node => Sinfo.Expression (Node (Aspect_Specification)),
Starting_Element => Aspect_Specification);
exception
when ASIS_Inappropriate_Element =>
raise;
when ASIS_Failed =>
if Status_Indicator = Unhandled_Exception_Error then
Add_Call_Information
(Argument => Aspect_Specification,
Outer_Call => Package_Name & "Aspect_Definition");
end if;
raise;
when Ex : others =>
Report_ASIS_Bug
(Query_Name => Package_Name & "Aspect_Definition",
Ex => Ex,
Arg_Element => Aspect_Specification);
end Aspect_Definition;
-----------------
-- Aspect_Mark --
-----------------
function Aspect_Mark
(Aspect_Specification : Asis.Element)
return Asis.Element
is
Arg_Kind : constant Internal_Element_Kinds :=
Int_Kind (Aspect_Specification);
Res_Node : Node_Id;
Res_Kind : Internal_Element_Kinds := An_Identifier;
begin
Check_Validity
(Aspect_Specification, Package_Name & "Aspect_Mark");
if Arg_Kind /= An_Aspect_Specification then
Raise_ASIS_Inappropriate_Element
(Diagnosis => Package_Name & "Aspect_Mark",
Wrong_Kind => Arg_Kind);
end if;
Res_Node := Node (Aspect_Specification);
if Class_Present (Res_Node) then
Res_Kind := A_Class_Attribute;
end if;
Res_Node := Sinfo.Identifier (Res_Node);
return Node_To_Element_New
(Node => Res_Node,
Starting_Element => Aspect_Specification,
Internal_Kind => Res_Kind);
exception
when ASIS_Inappropriate_Element =>
raise;
when ASIS_Failed =>
if Status_Indicator = Unhandled_Exception_Error then
Add_Call_Information
(Argument => Aspect_Specification,
Outer_Call => Package_Name & "Aspect_Mark");
end if;
raise;
when Ex : others =>
Report_ASIS_Bug
(Query_Name => Package_Name & "Aspect_Mark",
Ex => Ex,
Arg_Element => Aspect_Specification);
end Aspect_Mark;
------------------------------------------------------------------------------
-- NOT IMPLEMENTED
-- The query is implemented with the following ramification of its
-- definition:
--
-- 1. The list of appropriate kinds is:
--
-- Appropriate Definition_Kinds:
-- A_Type_Definition
-- A_Formal_Type_Declaration
-- A_Private_Type_Definition
-- A_Tagged_Private_Type_Definition
-- A_Private_Extension_Definition
-- A_Task_Definition
-- A_Protected_Definition
--
-- 2. The query returns only primitive operators of the type, except if the
-- argument is A_Formal_Type_Declaration. In the latter case the result
-- contains inherited user-defined operators and all the formal
-- operators defined for this type
--
-- 3. Any operator that satisfy conditions given in (2) and that has a
-- parameter or returns the result of the argument type is returned.
--
-- 4. In case of a private type and private extension, the query returns
-- the same results when applied to the private and to the full view.
--
-- 5. Implicit declarations of predefined operators are not supported. So
-- they are not included in the result of the query
function Corresponding_Type_Operators
(Type_Definition : Asis.Type_Definition)
return Asis.Declaration_List
is
Arg_Kind : constant Internal_Element_Kinds := Int_Kind (Type_Definition);
begin
Check_Validity (Type_Definition,
Package_Name & "Corresponding_Type_Operators");
if not (Arg_Kind in Internal_Type_Kinds or else
Arg_Kind in Internal_Formal_Type_Kinds or else
Arg_Kind in A_Private_Type_Definition ..
A_Protected_Definition)
then
Raise_ASIS_Inappropriate_Element
(Diagnosis => Package_Name & "Corresponding_Type_Operators",
Wrong_Kind => Arg_Kind);
end if;
return Inherited_Type_Operators (Type_Definition) &
Explicit_Type_Operators (Type_Definition);
exception
when ASIS_Inappropriate_Element =>
raise;
when ASIS_Failed =>
if Status_Indicator = Unhandled_Exception_Error then
Add_Call_Information
(Argument => Type_Definition,
Outer_Call => Package_Name & "Corresponding_Type_Operators");
end if;
raise;
when Ex : others =>
Report_ASIS_Bug
(Query_Name => Package_Name & "Corresponding_Type_Operators",
Ex => Ex,
Arg_Element => Type_Definition);
end Corresponding_Type_Operators;
-----------------------------------------------------------------------------
function Parent_Subtype_Indication
(Type_Definition : Asis.Type_Definition)
return Asis.Subtype_Indication
is
Arg_Kind : constant Internal_Element_Kinds := Int_Kind (Type_Definition);
Arg_Node : Node_Id;
begin
Check_Validity
(Type_Definition, Package_Name & "Parent_Subtype_Indication");
if not (Arg_Kind = A_Derived_Type_Definition or else
Arg_Kind = A_Derived_Record_Extension_Definition)
then
Raise_ASIS_Inappropriate_Element
(Diagnosis => Package_Name & "Parent_Subtype_Indication",
Wrong_Kind => Arg_Kind);
end if;
Arg_Node := Node (Type_Definition);
return Node_To_Element_New
(Node => Sinfo.Subtype_Indication (Arg_Node),
Starting_Element => Type_Definition,
Internal_Kind => A_Subtype_Indication);
exception
when ASIS_Inappropriate_Element =>
raise;
when ASIS_Failed =>
if Status_Indicator = Unhandled_Exception_Error then
Add_Call_Information
(Argument => Type_Definition,
Outer_Call => Package_Name & "Parent_Subtype_Indication");
end if;
raise;
when Ex : others =>
Report_ASIS_Bug
(Query_Name => Package_Name & "Parent_Subtype_Indication",
Ex => Ex,
Arg_Element => Type_Definition);
end Parent_Subtype_Indication;
-----------------------------------------------------------------------------
function Record_Definition
(Type_Definition : Asis.Type_Definition)
return Asis.Record_Definition
is
Arg_Kind : constant Internal_Element_Kinds := Int_Kind (Type_Definition);
Arg_Node : Node_Id;
Result_Kind : Internal_Element_Kinds;
Result_Node : Node_Id;
begin
Check_Validity (Type_Definition, Package_Name & "Record_Definition");
if not (Arg_Kind = A_Derived_Record_Extension_Definition or else
Arg_Kind = A_Record_Type_Definition or else
Arg_Kind = A_Tagged_Record_Type_Definition)
then
Raise_ASIS_Inappropriate_Element
(Diagnosis => Package_Name & "Record_Definition",
Wrong_Kind => Arg_Kind);
end if;
Arg_Node := Node (Type_Definition);
if Arg_Kind = A_Derived_Record_Extension_Definition then
Result_Node := Record_Extension_Part (Arg_Node);
else
Result_Node := Arg_Node;
end if;
if Null_Present (Result_Node) then
Result_Kind := A_Null_Record_Definition;
else
Result_Kind := A_Record_Definition;
end if;
return Node_To_Element_New
(Node => Result_Node,
Starting_Element => Type_Definition,
Internal_Kind => Result_Kind);
exception
when ASIS_Inappropriate_Element =>
raise;
when ASIS_Failed =>
if Status_Indicator = Unhandled_Exception_Error then
Add_Call_Information
(Argument => Type_Definition,
Outer_Call => Package_Name & "Record_Definition");
end if;
raise;
when Ex : others =>
Report_ASIS_Bug
(Query_Name => Package_Name & "Record_Definition",
Ex => Ex,
Arg_Element => Type_Definition);
end Record_Definition;
------------------------------------------------------------------------------
-- NOT IMPLEMENTED???
function Implicit_Inherited_Declarations
(Definition : Asis.Definition)
return Asis.Declaration_List
is
Arg_Kind : constant Internal_Element_Kinds := Int_Kind (Definition);
Type_Entity_Node : Node_Id;
Type_Decl_Node : Node_Id;
Inherit_Discrims : Boolean := True;
begin
Check_Validity
(Definition, Package_Name & "Implicit_Inherited_Declarations");
if not (Arg_Kind = A_Private_Extension_Definition or else
Arg_Kind = A_Derived_Type_Definition or else
Arg_Kind = A_Derived_Record_Extension_Definition or else
Arg_Kind = A_Formal_Derived_Type_Definition)
then
Raise_ASIS_Inappropriate_Element
(Diagnosis => Package_Name & "Implicit_Inherited_Declarations",
Wrong_Kind => Arg_Kind);
end if;
Type_Entity_Node := Defining_Identifier (Parent (R_Node (Definition)));
if not (Is_Record_Type (Type_Entity_Node) or else
Is_Enumeration_Type (Type_Entity_Node) or else
Is_Task_Type (Type_Entity_Node) or else
Is_Protected_Type (Type_Entity_Node))
then
return Nil_Element_List;
end if;
Type_Decl_Node := Parent (R_Node (Definition));
if Present (Discriminant_Specifications
(Original_Node (Type_Decl_Node))) then
Inherit_Discrims := False;
end if;
if Is_Record_Type (Type_Entity_Node) then
Set_Inherited_Components (Definition, Inherit_Discrims);
elsif Is_Concurrent_Type (Type_Entity_Node) then
Set_Concurrent_Inherited_Components (Definition, Inherit_Discrims);
elsif Is_Enumeration_Type (Type_Entity_Node) then
if Present (First_Literal (Type_Entity_Node)) then
Set_Inherited_Literals (Definition);
else
-- Type derived (directly or indirectly) from Standard.Character
-- or Standard.Wide_Character
return Standard_Char_Decls
(Type_Definition => Definition,
Implicit => True);
end if;
else
Not_Implemented_Yet
(Diagnosis => Package_Name & "Implicit_Inherited_Declarations");
end if;
for J in 1 .. Asis_Element_Table.Last loop
Set_From_Implicit (Asis_Element_Table.Table (J), True);
Set_From_Inherited (Asis_Element_Table.Table (J), True);
Set_Node_Field_1 (Asis_Element_Table.Table (J), Type_Decl_Node);
end loop;
return Asis.Declaration_List
(Asis_Element_Table.Table (1 .. Asis_Element_Table.Last));
exception
when ASIS_Inappropriate_Element =>
raise;
when ASIS_Failed =>
if Status_Indicator = Unhandled_Exception_Error then
Add_Call_Information
(Argument => Definition,
Outer_Call => Package_Name & "Implicit_Inherited_Declarations");
end if;
raise;
when Ex : others =>
Report_ASIS_Bug
(Query_Name => Package_Name & "Implicit_Inherited_Declarations",
Ex => Ex,
Arg_Element => Definition);
end Implicit_Inherited_Declarations;
------------------------------------------------------------------------------
function Implicit_Inherited_Subprograms
(Definition : Asis.Definition)
return Asis.Declaration_List
is
Arg_Kind : constant Internal_Element_Kinds := Int_Kind (Definition);
Type_Entity_Node : Node_Id;
Next_Subpr_Node : Node_Id;
Next_Expl_Subpr : Node_Id;
Expl_Subpr_Name : Node_Id;
Next_Subpr_Kind : Internal_Element_Kinds;
Next_Subpr_Element : Element;
Result_Unit : Compilation_Unit;
begin
Check_Validity (Definition,
Package_Name & "Implicit_Inherited_Subprograms");
if not (Arg_Kind = A_Private_Extension_Definition or else
Arg_Kind = A_Derived_Type_Definition or else
Arg_Kind = A_Derived_Record_Extension_Definition or else
Arg_Kind = A_Formal_Derived_Type_Definition or else
Arg_Kind in Internal_Interface_Kinds or else
Arg_Kind in Internal_Formal_Interface_Kinds)
then
Raise_ASIS_Inappropriate_Element
(Diagnosis => Package_Name & "Implicit_Inherited_Subprograms",
Wrong_Kind => Arg_Kind);
end if;
Type_Entity_Node := R_Node (Definition);
if Nkind (Type_Entity_Node) /= N_Private_Extension_Declaration then
Type_Entity_Node := Parent (Type_Entity_Node);
end if;
Type_Entity_Node := Defining_Identifier (Type_Entity_Node);
Result_Unit := Encl_Unit (Definition);
Asis_Element_Table.Init;
Next_Subpr_Node := Next_Entity (Type_Entity_Node);
-- All the inherited subprograms can be *after* the type entity only
Type_Entity_Node := Parent (Type_Entity_Node);
-- now Type_Entity_Node points to the type declaration of the type
-- which inherits the result subprograms
while Present (Next_Subpr_Node) loop
if (Ekind (Next_Subpr_Node) = E_Procedure or else
Ekind (Next_Subpr_Node) = E_Function)
and then
Parent (Next_Subpr_Node) = Type_Entity_Node
and then
not (Is_Hidden (Next_Subpr_Node)
and then
Present (Interface_Alias (Next_Subpr_Node)))
then
-- This entity node represents the user-defined inherited
-- subprogram for Type_Entity_Node
Next_Expl_Subpr := Explicit_Parent_Subprogram (Next_Subpr_Node);
Expl_Subpr_Name := Next_Expl_Subpr;
if Is_Generic_Instance (Expl_Subpr_Name) then
-- Go to the instantiation entity node, because for the
-- expanded subprogram the front-end creates an artificial
-- name:
while Nkind (Expl_Subpr_Name) /= N_Package_Declaration loop
Expl_Subpr_Name := Parent (Expl_Subpr_Name);
end loop;
while Nkind (Expl_Subpr_Name) not in
N_Generic_Instantiation
loop
Expl_Subpr_Name := Next (Expl_Subpr_Name);
end loop;
Expl_Subpr_Name := Defining_Unit_Name (Expl_Subpr_Name);
end if;
if Chars (Next_Subpr_Node) = Chars (Expl_Subpr_Name) then
-- For this condition, see the discussion in 8215-007
Next_Expl_Subpr := Parent (Next_Expl_Subpr);
if Ekind (Next_Subpr_Node) = E_Function then
Next_Subpr_Kind := A_Function_Declaration;
elsif Null_Present (Next_Expl_Subpr) then
Next_Subpr_Kind := A_Null_Procedure_Declaration;
else
Next_Subpr_Kind := A_Procedure_Declaration;
end if;
Next_Expl_Subpr := Parent (Next_Expl_Subpr);
Next_Subpr_Element :=
Node_To_Element_New (Node => Next_Expl_Subpr,
Node_Field_1 => Next_Subpr_Node,
Internal_Kind => Next_Subpr_Kind,
Inherited => True,
In_Unit => Result_Unit);
-- See the comment in the body of
-- A4G.A_Sem.Get_Corr_Called_Entity
if Is_From_Instance (Next_Subpr_Node) then
Set_From_Instance (Next_Subpr_Element, True);
else
Set_From_Instance (Next_Subpr_Element, False);
end if;
Asis_Element_Table.Append (Next_Subpr_Element);
end if;
end if;
Next_Subpr_Node := Next_Entity (Next_Subpr_Node);
end loop;
return Asis.Declaration_List
(Asis_Element_Table.Table (1 .. Asis_Element_Table.Last));
exception
when ASIS_Inappropriate_Element =>
raise;
when ASIS_Failed =>
if Status_Indicator = Unhandled_Exception_Error then
Add_Call_Information
(Argument => Definition,
Outer_Call => Package_Name & "Implicit_Inherited_Subprograms");
end if;
raise;
when Ex : others =>
Report_ASIS_Bug
(Query_Name => Package_Name & "Implicit_Inherited_Subprograms",
Ex => Ex,
Arg_Element => Definition);
end Implicit_Inherited_Subprograms;
-----------------------------------------------------------------------------
function Corresponding_Parent_Subtype
(Type_Definition : Asis.Type_Definition)
return Asis.Declaration
is
Arg_Kind : constant Internal_Element_Kinds := Int_Kind (Type_Definition);
Type_Mark_Node : Node_Id;
Result_Node : Node_Id;
Result_Unit : Asis.Compilation_Unit;
Result : Asis.Element := Nil_Element;
begin
Check_Validity (Type_Definition,
Package_Name & "Corresponding_Parent_Subtype");
if not (Arg_Kind = A_Derived_Type_Definition or else
Arg_Kind = A_Derived_Record_Extension_Definition)
then
Raise_ASIS_Inappropriate_Element
(Diagnosis => Package_Name & "Corresponding_Parent_Subtype",
Wrong_Kind => Arg_Kind);
end if;
Type_Mark_Node := Sinfo.Subtype_Indication (Node (Type_Definition));
if Nkind (Type_Mark_Node) = N_Subtype_Indication then
Type_Mark_Node := Sinfo.Subtype_Mark (Type_Mark_Node);
end if;
if Nkind (Original_Node (Type_Mark_Node)) /= N_Attribute_Reference then
Result_Node := Entity (Type_Mark_Node);
Result_Node := Parent (Result_Node);
Result_Unit :=
Enclosing_Unit (Encl_Cont_Id (Type_Definition), Result_Node);
Result := Node_To_Element_New (Node => Result_Node,
In_Unit => Result_Unit);
end if;
return Result;
exception
when ASIS_Inappropriate_Element =>
raise;
when ASIS_Failed =>
if Status_Indicator = Unhandled_Exception_Error then
Add_Call_Information
(Argument => Type_Definition,
Outer_Call => Package_Name & "Corresponding_Parent_Subtype");
end if;
raise;
when Ex : others =>
Report_ASIS_Bug
(Query_Name => Package_Name & "Corresponding_Parent_Subtype",
Ex => Ex,
Arg_Element => Type_Definition);
end Corresponding_Parent_Subtype;
-----------------------------------------------------------------------------
function Corresponding_Root_Type
(Type_Definition : Asis.Type_Definition)
return Asis.Declaration
is
Arg_Kind : constant Internal_Element_Kinds := Int_Kind (Type_Definition);
Result_El : Asis.Declaration;
Result_Kind : Internal_Element_Kinds;
Def_El : Asis.Type_Definition;
Def_Kind : Internal_Element_Kinds;
begin
Check_Validity
(Type_Definition, Package_Name & "Corresponding_Root_Type");
if not (Arg_Kind = A_Derived_Type_Definition or else
Arg_Kind = A_Derived_Record_Extension_Definition)
then
Raise_ASIS_Inappropriate_Element
(Diagnosis => Package_Name & "Corresponding_Root_Type",
Wrong_Kind => Arg_Kind);
end if;
Result_El := Corresponding_Parent_Subtype_Unwind_Base (Type_Definition);
loop
Result_Kind := Int_Kind (Result_El);
if Result_Kind = A_Subtype_Declaration then
Result_El := Corresponding_First_Subtype (Result_El);
else
-- Result_El can be of An_Ordinary_Type_Declaration,
-- A_Task_Type_Declaration, A_Protected_Type_Declaration,
-- A_Private_Type_Declaration, A_Private_Extension_Declaration
-- or A_Formal_Type_Declaration only
if Result_Kind = An_Ordinary_Type_Declaration or else
Result_Kind = A_Formal_Type_Declaration
then
Def_El := Type_Declaration_View (Result_El);
Def_Kind := Int_Kind (Def_El);
if Def_Kind = A_Derived_Type_Definition or else
Def_Kind = A_Derived_Record_Extension_Definition
then
Result_El :=
Corresponding_Parent_Subtype_Unwind_Base (Def_El);
else
exit;
end if;
else
exit;
end if;
end if;
end loop;
return Result_El;
exception
when ASIS_Inappropriate_Element =>
raise;
when ASIS_Failed =>
if Status_Indicator = Unhandled_Exception_Error then
Add_Call_Information
(Argument => Type_Definition,
Outer_Call => Package_Name & "Corresponding_Root_Type");
end if;
raise;
when Ex : others =>
Report_ASIS_Bug
(Query_Name => Package_Name & "Corresponding_Root_Type",
Ex => Ex,
Arg_Element => Type_Definition);
end Corresponding_Root_Type;
------------------------------------------------------------------------------
function Corresponding_Type_Structure
(Type_Definition : Asis.Type_Definition)
return Asis.Declaration
is
Arg_Kind : constant Internal_Element_Kinds := Int_Kind (Type_Definition);
Result_El : Asis.Element;
Type_Def_El : Asis.Element;
Res_Entity_Node : Node_Id;
Tmp_Node : Node_Id;
begin
Check_Validity
(Type_Definition, Package_Name & "Corresponding_Type_Structure");
if not (Arg_Kind = A_Derived_Type_Definition or else
Arg_Kind = A_Derived_Record_Extension_Definition)
then
Raise_ASIS_Inappropriate_Element
(Diagnosis => Package_Name & "Corresponding_Type_Structure",
Wrong_Kind => Arg_Kind);
end if;
-- The implementation approach:
-- 1. We are considering, that the following things change the
-- type structure (type representation):
-- (1) adding the new component to a tagged record type;
-- (2) applying any representation pragma or representation
-- clause to a type in the derivation chain
-- ??? What about adding a new primitive operation in case of a
-- ??? tagged type? It changes the representation of the tag.
--
-- 2. The implementation is based on other semantic queries from
-- this package. The idea is to make the implementation more
-- stable and to isolate the code which depends on processing of
-- implicit types in the tree
Result_El := Enclosing_Element (Type_Definition);
Res_Entity_Node := Defining_Identifier (Node (Result_El));
Derivation_Chain : loop
-- In this loop we are iterating through the derivation chain.
-- There are three reasons to exit the loop:
-- 1. Result_El has representation items;
-- 2. Result_El is not a derived type
-- 3. Result_El defines a new component
Tmp_Node := First_Rep_Item (Res_Entity_Node);
while Present (Tmp_Node) loop
if not Is_Derived_Rep_Item (Res_Entity_Node, Tmp_Node) then
exit Derivation_Chain;
end if;
Tmp_Node := Next_Rep_Item (Tmp_Node);
end loop;
Type_Def_El := Type_Declaration_View (Result_El);
case Int_Kind (Type_Def_El) is
when A_Derived_Type_Definition |
A_Formal_Derived_Type_Definition =>
null;
when A_Derived_Record_Extension_Definition =>
-- Here we are iterating through the list of the components
-- checking if there is a new, non-inherited component:
Tmp_Node := First_Entity (Res_Entity_Node);
while Present (Tmp_Node) loop
if (Ekind (Tmp_Node) = E_Component or else
Ekind (Tmp_Node) = E_Discriminant)
and then
Original_Record_Component (Tmp_Node) = Tmp_Node
then
-- Note that we can have implicit (sub)types in the chain
exit Derivation_Chain;
end if;
Tmp_Node := Next_Entity (Tmp_Node);
end loop;
when others =>
exit Derivation_Chain;
end case;
Result_El := Type_Declaration_View (Result_El);
Result_El := Corresponding_Parent_Subtype (Result_El);
if Int_Kind (Result_El) = A_Subtype_Declaration then
Result_El := Corresponding_First_Subtype (Result_El);
end if;
Res_Entity_Node := Defining_Identifier (Node (Result_El));
end loop Derivation_Chain;
return Result_El;
exception
when ASIS_Inappropriate_Element =>
raise;
when ASIS_Failed =>
if Status_Indicator = Unhandled_Exception_Error then
Add_Call_Information
(Argument => Type_Definition,
Outer_Call => Package_Name & "Corresponding_Type_Structure");
end if;
raise;
when Ex : others =>
Report_ASIS_Bug
(Query_Name => Package_Name & "Corresponding_Type_Structure",
Ex => Ex,
Arg_Element => Type_Definition);
end Corresponding_Type_Structure;
------------------------------------------------------------------------------
function Enumeration_Literal_Declarations
(Type_Definition : Asis.Type_Definition)
return Asis.Declaration_List
is
Arg_Kind : constant Internal_Element_Kinds := Int_Kind (Type_Definition);
Arg_Node : Node_Id;
begin
Check_Validity
(Type_Definition, Package_Name & "Enumeration_Literal_Declarations");
if not (Arg_Kind = An_Enumeration_Type_Definition) then
Raise_ASIS_Inappropriate_Element
(Diagnosis => Package_Name & "Enumeration_Literal_Declarations",
Wrong_Kind => Arg_Kind);
end if;
Arg_Node := Node (Type_Definition);
if Is_Standard_Char_Type (Arg_Node) then
-- There is no Literals list for standard char types, so a special
-- processing is needed
return Standard_Char_Decls (Type_Definition);
else
return N_To_E_List_New
(List => Literals (Arg_Node),
Starting_Element => Type_Definition,
Internal_Kind => An_Enumeration_Literal_Specification);
end if;
exception
when ASIS_Inappropriate_Element =>
raise;
when ASIS_Failed =>
if Status_Indicator = Unhandled_Exception_Error then
Add_Call_Information
(Argument => Type_Definition,
Outer_Call => Package_Name &
"Enumeration_Literal_Declarations");
end if;
raise;
when Ex : others =>
Report_ASIS_Bug
(Query_Name => Package_Name & "Enumeration_Literal_Declarations",
Ex => Ex,
Arg_Element => Type_Definition);
end Enumeration_Literal_Declarations;
------------------------------------------------------------------------------
-- OPEN PROBLEMS:
--
-- 1. Standard.Character and Standard.Whide_Character types have
-- to be processed specifically (See Sinfo.ads item for
-- N_Enumeration_Type_Definition Node. This is not implemented yet.
------------------------------------------------------------------------------
function Integer_Constraint
(Type_Definition : Asis.Type_Definition)
return Asis.Range_Constraint
is
Arg_Kind : constant Internal_Element_Kinds := Int_Kind (Type_Definition);
Arg_Node : Node_Id;
begin
Check_Validity
(Type_Definition, Package_Name & "Integer_Constraint");
if not (Arg_Kind = A_Signed_Integer_Type_Definition) then
Raise_ASIS_Inappropriate_Element
(Diagnosis => Package_Name & "Integer_Constraint",
Wrong_Kind => Arg_Kind);
end if;
Arg_Node := Node (Type_Definition);
return Node_To_Element_New
(Node => Arg_Node,
Starting_Element => Type_Definition,
Internal_Kind => A_Simple_Expression_Range);
exception
when ASIS_Inappropriate_Element =>
raise;
when ASIS_Failed =>
if Status_Indicator = Unhandled_Exception_Error then
Add_Call_Information
(Argument => Type_Definition,
Outer_Call => Package_Name & "Integer_Constraint");
end if;
raise;
when Ex : others =>
Report_ASIS_Bug
(Query_Name => Package_Name & "Integer_Constraint",
Ex => Ex,
Arg_Element => Type_Definition);
end Integer_Constraint;
-----------------------------------------------------------------------------
function Mod_Static_Expression
(Type_Definition : Asis.Type_Definition)
return Asis.Expression
is
Arg_Kind : constant Internal_Element_Kinds := Int_Kind (Type_Definition);
Arg_Node : Node_Id;
begin
Check_Validity
(Type_Definition, Package_Name & "Mod_Static_Expression");
if not (Arg_Kind = A_Modular_Type_Definition) then
Raise_ASIS_Inappropriate_Element
(Diagnosis => Package_Name & "Mod_Static_Expression",
Wrong_Kind => Arg_Kind);
end if;
Arg_Node := Node (Type_Definition);
return Node_To_Element_New
(Node => Sinfo.Expression (Arg_Node),
Starting_Element => Type_Definition);
exception
when ASIS_Inappropriate_Element =>
raise;
when ASIS_Failed =>
if Status_Indicator = Unhandled_Exception_Error then
Add_Call_Information
(Argument => Type_Definition,
Outer_Call => Package_Name & "Mod_Static_Expression");
end if;
raise;
when Ex : others =>
Report_ASIS_Bug
(Query_Name => Package_Name & "Mod_Static_Expression",
Ex => Ex,
Arg_Element => Type_Definition);
end Mod_Static_Expression;
-----------------------------------------------------------------------------
function Digits_Expression
(Definition : Asis.Definition)
return Asis.Expression
is
Arg_Kind : constant Internal_Element_Kinds := Int_Kind (Definition);
Arg_Node : Node_Id;
begin
Check_Validity (Definition, Package_Name & "Digits_Expression");
if not (Arg_Kind = A_Floating_Point_Definition or else
Arg_Kind = A_Decimal_Fixed_Point_Definition or else
Arg_Kind = A_Digits_Constraint)
then
Raise_ASIS_Inappropriate_Element
(Diagnosis => Package_Name & "Digits_Expression",
Wrong_Kind => Arg_Kind);
end if;
Arg_Node := Node (Definition);
return Node_To_Element_New
(Node => Digits_Expression (Arg_Node),
Starting_Element => Definition);
exception
when ASIS_Inappropriate_Element =>
raise;
when ASIS_Failed =>
if Status_Indicator = Unhandled_Exception_Error then
Add_Call_Information
(Argument => Definition,
Outer_Call => Package_Name & "Digits_Expression");
end if;
raise;
when Ex : others =>
Report_ASIS_Bug
(Query_Name => Package_Name & "Digits_Expression",
Ex => Ex,
Arg_Element => Definition);
end Digits_Expression;
-----------------------------------------------------------------------------
function Delta_Expression
(Definition : Asis.Definition)
return Asis.Expression
is
Arg_Kind : constant Internal_Element_Kinds := Int_Kind (Definition);
Arg_Node : Node_Id;
begin
Check_Validity (Definition, Package_Name & "Delta_Expression");
if not (Arg_Kind = An_Ordinary_Fixed_Point_Definition or else
Arg_Kind = A_Decimal_Fixed_Point_Definition or else
Arg_Kind = A_Delta_Constraint)
then
Raise_ASIS_Inappropriate_Element
(Diagnosis => Package_Name & "Delta_Expression",
Wrong_Kind => Arg_Kind);
end if;
Arg_Node := Node (Definition);
return Node_To_Element_New
(Node => Delta_Expression (Arg_Node),
Starting_Element => Definition);
exception
when ASIS_Inappropriate_Element =>
raise;
when ASIS_Failed =>
if Status_Indicator = Unhandled_Exception_Error then
Add_Call_Information
(Argument => Definition,
Outer_Call => Package_Name & "Delta_Expression");
end if;
raise;
when Ex : others =>
Report_ASIS_Bug
(Query_Name => Package_Name & "Delta_Expression",
Ex => Ex,
Arg_Element => Definition);
end Delta_Expression;
-----------------------------------------------------------------------------
function Real_Range_Constraint
(Definition : Asis.Definition)
return Asis.Range_Constraint
is
Arg_Kind : constant Internal_Element_Kinds := Int_Kind (Definition);
Arg_Node : Node_Id;
Result_Node : Node_Id;
begin
Check_Validity (Definition, Package_Name & "Real_Range_Constraint");
if not (Arg_Kind = A_Floating_Point_Definition or else
Arg_Kind = An_Ordinary_Fixed_Point_Definition or else
Arg_Kind = A_Decimal_Fixed_Point_Definition or else
Arg_Kind = A_Digits_Constraint or else
Arg_Kind = A_Delta_Constraint)
then
Raise_ASIS_Inappropriate_Element
(Diagnosis => Package_Name & "Real_Range_Constraint",
Wrong_Kind => Arg_Kind);
end if;
Arg_Node := Node (Definition);
if Arg_Kind = A_Floating_Point_Definition or else
Arg_Kind = An_Ordinary_Fixed_Point_Definition or else
Arg_Kind = A_Decimal_Fixed_Point_Definition
then
Result_Node := Real_Range_Specification (Arg_Node);
else
-- Arg_Kind = A_Digits_Constraint or Arg_Kind = A_Delta_Constraint
Result_Node := Sinfo.Range_Constraint (Arg_Node);
end if;
if No (Result_Node) then
return Nil_Element;
else
return Node_To_Element_New
(Node => Result_Node,
Starting_Element => Definition,
Internal_Kind => A_Simple_Expression_Range);
end if;
exception
when ASIS_Inappropriate_Element =>
raise;
when ASIS_Failed =>
if Status_Indicator = Unhandled_Exception_Error then
Add_Call_Information (
Argument => Definition,
Outer_Call => Package_Name & "Real_Range_Constraint");
end if;
raise;
when Ex : others =>
Report_ASIS_Bug
(Query_Name => Package_Name & "Real_Range_Constraint",
Ex => Ex,
Arg_Element => Definition);
end Real_Range_Constraint;
-----------------------------------------------------------------------------
function Index_Subtype_Definitions
(Type_Definition : Asis.Type_Definition)
return Asis.Expression_List
is
Arg_Kind : constant Internal_Element_Kinds := Int_Kind (Type_Definition);
Arg_Node : Node_Id;
begin
Check_Validity (Type_Definition,
Package_Name & "Index_Subtype_Definitions");
if not (Arg_Kind = An_Unconstrained_Array_Definition or else
Arg_Kind = A_Formal_Unconstrained_Array_Definition)
then
Raise_ASIS_Inappropriate_Element
(Diagnosis => Package_Name & "Index_Subtype_Definitions",
Wrong_Kind => Arg_Kind);
end if;
Arg_Node := Node (Type_Definition);
return N_To_E_List_New (List => Subtype_Marks (Arg_Node),
Starting_Element => Type_Definition);
exception
when ASIS_Inappropriate_Element =>
raise;
when ASIS_Failed =>
if Status_Indicator = Unhandled_Exception_Error then
Add_Call_Information (
Argument => Type_Definition,
Outer_Call => Package_Name & "Index_Subtype_Definitions");
end if;
raise;
when Ex : others =>
Report_ASIS_Bug
(Query_Name => Package_Name & "Index_Subtype_Definitions",
Ex => Ex,
Arg_Element => Type_Definition);
end Index_Subtype_Definitions;
-----------------------------------------------------------------------------
function Discrete_Subtype_Definitions
(Type_Definition : Asis.Type_Definition)
return Asis.Definition_List
is
Arg_Kind : constant Internal_Element_Kinds := Int_Kind (Type_Definition);
Arg_Node : Node_Id;
begin
Check_Validity
(Type_Definition, Package_Name & "Discrete_Subtype_Definitions");
if not (Arg_Kind = A_Constrained_Array_Definition or else
Arg_Kind = A_Formal_Constrained_Array_Definition)
then
Raise_ASIS_Inappropriate_Element
(Diagnosis => Package_Name & "Discrete_Subtype_Definitions",
Wrong_Kind => Arg_Kind);
end if;
Arg_Node := Node (Type_Definition);
return N_To_E_List_New (
List => Discrete_Subtype_Definitions (Arg_Node),
Starting_Element => Type_Definition);
exception
when ASIS_Inappropriate_Element =>
raise;
when ASIS_Failed =>
if Status_Indicator = Unhandled_Exception_Error then
Add_Call_Information
(Argument => Type_Definition,
Outer_Call => Package_Name & "Discrete_Subtype_Definitions");
end if;
raise;
when Ex : others =>
Report_ASIS_Bug
(Query_Name => Package_Name & "Discrete_Subtype_Definitions",
Ex => Ex,
Arg_Element => Type_Definition);
end Discrete_Subtype_Definitions;
--------------------------------
-- Array_Component_Definition --
--------------------------------
function Array_Component_Definition
(Type_Definition : Asis.Type_Definition)
return Asis.Component_Definition
is
Arg_Kind : constant Internal_Element_Kinds := Int_Kind (Type_Definition);
Arg_Node : Node_Id;
begin
Check_Validity
(Type_Definition, Package_Name & "Array_Component_Definition");
if not (Arg_Kind = An_Unconstrained_Array_Definition or else
Arg_Kind = A_Constrained_Array_Definition or else
Arg_Kind = A_Formal_Unconstrained_Array_Definition or else
Arg_Kind = A_Formal_Constrained_Array_Definition)
then
Raise_ASIS_Inappropriate_Element
(Diagnosis => Package_Name & "Array_Component_Definition",
Wrong_Kind => Arg_Kind);
end if;
Arg_Node := Node (Type_Definition);
return Node_To_Element_New
(Node => Sinfo.Component_Definition (Arg_Node),
Starting_Element => Type_Definition,
Internal_Kind => A_Component_Definition);
exception
when ASIS_Inappropriate_Element =>
raise;
when ASIS_Failed =>
if Status_Indicator = Unhandled_Exception_Error then
Add_Call_Information
(Argument => Type_Definition,
Outer_Call => Package_Name & "Array_Component_Definition");
end if;
raise;
when Ex : others =>
Report_ASIS_Bug
(Query_Name => Package_Name & "Array_Component_Definition",
Ex => Ex,
Arg_Element => Type_Definition);
end Array_Component_Definition;
-----------------------------------------------------------------------------
function Access_To_Object_Definition
(Type_Definition : Asis.Type_Definition)
return Asis.Subtype_Indication
is
Arg_Kind : constant Internal_Element_Kinds := Int_Kind (Type_Definition);
Arg_Node : Node_Id;
begin
Check_Validity
(Type_Definition, Package_Name & "Access_To_Object_Definition");
if not (Arg_Kind = A_Pool_Specific_Access_To_Variable or else
Arg_Kind = An_Access_To_Variable or else
Arg_Kind = An_Access_To_Constant or else
Arg_Kind = A_Formal_Pool_Specific_Access_To_Variable or else
Arg_Kind = A_Formal_Access_To_Variable or else
Arg_Kind = A_Formal_Access_To_Constant)
then
Raise_ASIS_Inappropriate_Element
(Diagnosis => Package_Name & "Access_To_Object_Definition",
Wrong_Kind => Arg_Kind);
end if;
Arg_Node := Node (Type_Definition);
return Node_To_Element_New
(Node => Sinfo.Subtype_Indication (Arg_Node),
Starting_Element => Type_Definition,
Internal_Kind => A_Subtype_Indication);
exception
when ASIS_Inappropriate_Element =>
raise;
when ASIS_Failed =>
if Status_Indicator = Unhandled_Exception_Error then
Add_Call_Information
(Argument => Type_Definition,
Outer_Call => Package_Name & "Access_To_Object_Definition");
end if;
raise;
when Ex : others =>
Report_ASIS_Bug
(Query_Name => Package_Name & "Access_To_Object_Definition",
Ex => Ex,
Arg_Element => Type_Definition);
end Access_To_Object_Definition;
-----------------------------------------------------------------------------
function Access_To_Subprogram_Parameter_Profile
(Type_Definition : Asis.Type_Definition)
return Asis.Parameter_Specification_List
is
Arg_Kind : constant Internal_Element_Kinds := Int_Kind (Type_Definition);
Arg_Node : Node_Id;
Result_List : List_Id;
begin
Check_Validity
(Type_Definition,
Package_Name & "Access_To_Subprogram_Parameter_Profile");
if not (Arg_Kind = An_Access_To_Procedure or else
Arg_Kind = An_Access_To_Protected_Procedure or else
Arg_Kind = An_Access_To_Function or else
Arg_Kind = An_Access_To_Protected_Function or else
Arg_Kind = A_Formal_Access_To_Procedure or else
Arg_Kind = A_Formal_Access_To_Protected_Procedure or else
Arg_Kind = A_Formal_Access_To_Function or else
Arg_Kind = A_Formal_Access_To_Protected_Function or else
-- --|A2005 start
Arg_Kind = An_Anonymous_Access_To_Procedure or else
Arg_Kind = An_Anonymous_Access_To_Protected_Procedure or else
Arg_Kind = An_Anonymous_Access_To_Function or else
Arg_Kind = An_Anonymous_Access_To_Protected_Function)
-- --|A2005 end
then
Raise_ASIS_Inappropriate_Element
(Diagnosis =>
Package_Name & "Access_To_Subprogram_Parameter_Profile",
Wrong_Kind => Arg_Kind);
end if;
Arg_Node := Node (Type_Definition);
-- --|A2005 start
if Nkind (Arg_Node) = N_Access_Definition then
Arg_Node := Sinfo.Access_To_Subprogram_Definition (Arg_Node);
end if;
-- --|A2005 end
Result_List := Parameter_Specifications (Arg_Node);
if No (Result_List) then
return Nil_Element_List;
else
return N_To_E_List_New
(List => Result_List,
Starting_Element => Type_Definition,
Internal_Kind => A_Parameter_Specification);
end if;
exception
when ASIS_Inappropriate_Element =>
raise;
when ASIS_Failed =>
if Status_Indicator = Unhandled_Exception_Error then
Add_Call_Information
(Argument => Type_Definition,
Outer_Call => Package_Name &
"Access_To_Subprogram_Parameter_Profile");
end if;
raise;
when Ex : others =>
Report_ASIS_Bug
(Query_Name => Package_Name &
"Access_To_Subprogram_Parameter_Profile",
Ex => Ex,
Arg_Element => Type_Definition);
end Access_To_Subprogram_Parameter_Profile;
-----------------------------------------------------------------------------
function Access_To_Function_Result_Profile
(Type_Definition : Asis.Type_Definition)
return Asis.Expression
is
Arg_Kind : constant Internal_Element_Kinds := Int_Kind (Type_Definition);
Arg_Node : Node_Id;
begin
Check_Validity
(Type_Definition, Package_Name & "Access_To_Function_Result_Profile");
if not (Arg_Kind = An_Access_To_Function or else
Arg_Kind = An_Access_To_Protected_Function or else
Arg_Kind = A_Formal_Access_To_Function or else
Arg_Kind = A_Formal_Access_To_Protected_Function or else
-- --|A2005 start
Arg_Kind = An_Anonymous_Access_To_Function or else
Arg_Kind = An_Anonymous_Access_To_Protected_Function)
-- --|A2005 end
then
Raise_ASIS_Inappropriate_Element
(Diagnosis => Package_Name & "Access_To_Function_Result_Profile",
Wrong_Kind => Arg_Kind);
end if;
Arg_Node := Node (Type_Definition);
-- --|A2005 start
if Nkind (Arg_Node) = N_Access_Definition then
Arg_Node := Sinfo.Access_To_Subprogram_Definition (Arg_Node);
end if;
-- --|A2005 end
return Node_To_Element_New
(Node => Sinfo.Result_Definition (Arg_Node),
Starting_Element => Type_Definition);
exception
when ASIS_Inappropriate_Element =>
raise;
when ASIS_Failed =>
if Status_Indicator = Unhandled_Exception_Error then
Add_Call_Information
(Argument => Type_Definition,
Outer_Call => Package_Name &
"Access_To_Function_Result_Profile");
end if;
raise;
when Ex : others =>
Report_ASIS_Bug
(Query_Name => Package_Name & "Access_To_Function_Result_Profile",
Ex => Ex,
Arg_Element => Type_Definition);
end Access_To_Function_Result_Profile;
-----------------------------------------------------------------------------
function Subtype_Mark
(Definition : Asis.Definition)
return Asis.Expression
is
Arg_Kind : constant Internal_Element_Kinds := Int_Kind (Definition);
Arg_Node : Node_Id;
Result_Node : Node_Id;
Result_Kind : Internal_Element_Kinds := Not_An_Element;
begin
Check_Validity (Definition, Package_Name & "Subtype_Mark");
if not (Arg_Kind = A_Subtype_Indication or else
Arg_Kind = A_Discrete_Subtype_Indication or else
Arg_Kind = A_Formal_Derived_Type_Definition or else
Arg_Kind = A_Discrete_Subtype_Indication_As_Subtype_Definition)
then
Raise_ASIS_Inappropriate_Element
(Diagnosis => Package_Name & "Subtype_Mark",
Wrong_Kind => Arg_Kind);
end if;
Arg_Node := Node (Definition);
if Nkind (Arg_Node) = N_Subtype_Indication or else
Nkind (Arg_Node) = N_Formal_Derived_Type_Definition
then
Result_Node := Sinfo.Subtype_Mark (Arg_Node);
else
Result_Node := R_Node (Definition);
end if;
if Nkind (Original_Node (Result_Node)) = N_Identifier and then
not Is_Rewrite_Substitution (Result_Node)
then
if Is_Part_Of_Instance (Definition) then
if Represents_Class_Wide_Type_In_Instance (Result_Node) then
Result_Kind := A_Class_Attribute;
elsif Represents_Base_Type_In_Instance (Result_Node) then
Result_Kind := A_Base_Attribute;
else
Result_Kind := An_Identifier;
end if;
else
Result_Kind := An_Identifier;
end if;
elsif Nkind (Original_Node (Result_Node)) = N_Expanded_Name then
Result_Kind := A_Selected_Component;
end if;
return Node_To_Element_New
(Node => Result_Node,
Starting_Element => Definition,
Internal_Kind => Result_Kind);
exception
when ASIS_Inappropriate_Element =>
raise;
when ASIS_Failed =>
if Status_Indicator = Unhandled_Exception_Error then
Add_Call_Information
(Argument => Definition,
Outer_Call => Package_Name & "Subtype_Mark");
end if;
raise;
when Ex : others =>
Report_ASIS_Bug
(Query_Name => Package_Name & "Subtype_Mark",
Ex => Ex,
Arg_Element => Definition);
end Subtype_Mark;
-----------------------------------------------------------------------------
function Subtype_Constraint
(Definition : Asis.Definition)
return Asis.Constraint
is
Arg_Kind : constant Internal_Element_Kinds := Int_Kind (Definition);
Arg_Node : Node_Id;
Result_Node : Node_Id := Empty;
Result_Kind : Internal_Element_Kinds := Not_An_Element;
begin
Check_Validity (Definition, Package_Name & "Subtype_Constraint");
if not (Arg_Kind = A_Subtype_Indication or else
Arg_Kind = A_Discrete_Subtype_Indication or else
Arg_Kind = A_Discrete_Subtype_Indication_As_Subtype_Definition)
then
Raise_ASIS_Inappropriate_Element
(Diagnosis => Package_Name & "Subtype_Constraint",
Wrong_Kind => Arg_Kind);
end if;
Arg_Node := Node (Definition);
if Nkind (Arg_Node) = N_Subtype_Indication then
Result_Node := Sinfo.Constraint (Arg_Node);
elsif Sloc (Arg_Node) <= Standard_Location and then
Nkind (Parent (Arg_Node)) = N_Subtype_Declaration
then
-- This is either Standard.Positive or Standard.Natural,
-- they have the constraint information not in
-- N_Subtype_Declaration node, but in N_Defining_Identifier node
Result_Node := Scalar_Range (Defining_Identifier (Parent (Arg_Node)));
Result_Kind := A_Simple_Expression_Range;
end if;
return Node_To_Element_New
(Node => Result_Node,
Starting_Element => Definition,
Internal_Kind => Result_Kind);
exception
when ASIS_Inappropriate_Element =>
raise;
when ASIS_Failed =>
if Status_Indicator = Unhandled_Exception_Error then
Add_Call_Information
(Argument => Definition,
Outer_Call => Package_Name & "Subtype_Constraint");
end if;
raise;
when Ex : others =>
Report_ASIS_Bug
(Query_Name => Package_Name & "Subtype_Constraint",
Ex => Ex,
Arg_Element => Definition);
end Subtype_Constraint;
-----------------------------------------------------------------------------
function Lower_Bound
(Constraint : Asis.Range_Constraint)
return Asis.Expression
is
Arg_Kind : constant Internal_Element_Kinds := Int_Kind (Constraint);
Arg_Node : Node_Id;
Result_Node : Node_Id;
begin
Check_Validity (Constraint, Package_Name & "Lower_Bound");
if not (Arg_Kind = A_Simple_Expression_Range or else
Arg_Kind = A_Discrete_Simple_Expression_Range or else
Arg_Kind =
A_Discrete_Simple_Expression_Range_As_Subtype_Definition)
then
Raise_ASIS_Inappropriate_Element
(Diagnosis => Package_Name & "Lower_Bound",
Wrong_Kind => Arg_Kind);
end if;
Arg_Node := Node (Constraint);
if Nkind (Arg_Node) = N_Range_Constraint then
Result_Node := Low_Bound (Range_Expression (Arg_Node));
elsif Nkind (Arg_Node) = N_Component_Clause then
Result_Node := First_Bit (Arg_Node);
else
-- Nkind (Arg_Node) = N_Range or else
-- Nkind (Arg_Node) = N_Real_Range_Specification
Result_Node := Low_Bound (Arg_Node);
end if;
return Node_To_Element_New
(Node => Result_Node,
Starting_Element => Constraint);
exception
when ASIS_Inappropriate_Element =>
raise;
when ASIS_Failed =>
if Status_Indicator = Unhandled_Exception_Error then
Add_Call_Information
(Argument => Constraint,
Outer_Call => Package_Name & "Lower_Bound");
end if;
raise;
when Ex : others =>
Report_ASIS_Bug
(Query_Name => Package_Name & "Lower_Bound",
Ex => Ex,
Arg_Element => Constraint);
end Lower_Bound;
-----------------------------------------------------------------------------
function Upper_Bound
(Constraint : Asis.Range_Constraint)
return Asis.Expression
is
Arg_Kind : constant Internal_Element_Kinds := Int_Kind (Constraint);
Arg_Node : Node_Id;
Result_Node : Node_Id;
begin
Check_Validity (Constraint, Package_Name & "Upper_Bound");
if not (Arg_Kind = A_Simple_Expression_Range or else
Arg_Kind = A_Discrete_Simple_Expression_Range or else
Arg_Kind =
A_Discrete_Simple_Expression_Range_As_Subtype_Definition)
then
Raise_ASIS_Inappropriate_Element
(Diagnosis => Package_Name & "Upper_Bound",
Wrong_Kind => Arg_Kind);
end if;
Arg_Node := Node (Constraint);
if Nkind (Arg_Node) = N_Range_Constraint then
Result_Node := High_Bound (Range_Expression (Arg_Node));
elsif Nkind (Arg_Node) = N_Component_Clause then
Result_Node := Last_Bit (Arg_Node);
else
Result_Node := High_Bound (Arg_Node);
end if;
return Node_To_Element_New
(Node => Result_Node,
Starting_Element => Constraint);
exception
when ASIS_Inappropriate_Element =>
raise;
when ASIS_Failed =>
if Status_Indicator = Unhandled_Exception_Error then
Add_Call_Information
(Argument => Constraint,
Outer_Call => Package_Name & "Upper_Bound");
end if;
raise;
when Ex : others =>
Report_ASIS_Bug
(Query_Name => Package_Name & "Upper_Bound",
Ex => Ex,
Arg_Element => Constraint);
end Upper_Bound;
-----------------------------------------------------------------------------
function Range_Attribute
(Constraint : Asis.Range_Constraint)
return Asis.Expression
is
Arg_Kind : constant Internal_Element_Kinds := Int_Kind (Constraint);
Arg_Node : constant Node_Id := Node (Constraint);
Result_Node : Node_Id;
begin
Check_Validity (Constraint, Package_Name & "Range_Attribute");
if not (Arg_Kind = A_Range_Attribute_Reference or else
Arg_Kind = A_Discrete_Range_Attribute_Reference or else
Arg_Kind =
A_Discrete_Range_Attribute_Reference_As_Subtype_Definition)
then
Raise_ASIS_Inappropriate_Element
(Diagnosis => Package_Name & "Range_Attribute",
Wrong_Kind => Arg_Kind);
end if;
if Nkind (Arg_Node) = N_Range_Constraint then
-- one step down to N_Attruibute_Reference node
Result_Node := Range_Expression (Arg_Node);
else
Result_Node := R_Node (Constraint);
end if;
return Node_To_Element_New
(Starting_Element => Constraint,
Node => Result_Node,
Internal_Kind => A_Range_Attribute);
exception
when ASIS_Inappropriate_Element =>
raise;
when ASIS_Failed =>
if Status_Indicator = Unhandled_Exception_Error then
Add_Call_Information
(Argument => Constraint,
Outer_Call => Package_Name & "Range_Attribute");
end if;
raise;
when Ex : others =>
Report_ASIS_Bug
(Query_Name => Package_Name & "Range_Attribute",
Ex => Ex,
Arg_Element => Constraint);
end Range_Attribute;
-------------------------------------------------------------------------
function Discrete_Ranges
(Constraint : Asis.Constraint)
return Asis.Discrete_Range_List
is
Arg_Kind : constant Internal_Element_Kinds := Int_Kind (Constraint);
Arg_Node : Node_Id;
begin
Check_Validity (Constraint, Package_Name & "Discrete_Ranges");
if not (Arg_Kind = An_Index_Constraint) then
Raise_ASIS_Inappropriate_Element
(Diagnosis => Package_Name & "Discrete_Ranges",
Wrong_Kind => Arg_Kind);
end if;
Arg_Node := Node (Constraint);
return N_To_E_List_New (List => Constraints (Arg_Node),
Starting_Element => Constraint);
exception
when ASIS_Inappropriate_Element =>
raise;
when ASIS_Failed =>
if Status_Indicator = Unhandled_Exception_Error then
Add_Call_Information
(Argument => Constraint,
Outer_Call => Package_Name & "Discrete_Ranges");
end if;
raise;
when Ex : others =>
Report_ASIS_Bug
(Query_Name => Package_Name & "Discrete_Ranges",
Ex => Ex,
Arg_Element => Constraint);
end Discrete_Ranges;
------------------------------------------------------------------------------
-- ??? PARTIALLY IMPLEMENTED, CANNOT PROCESS THE CASE WHEN
-- ??? NORMALIZED = TRUE
function Discriminant_Associations
(Constraint : Asis.Constraint;
Normalized : Boolean := False)
return Asis.Discriminant_Association_List
is
Arg_Kind : constant Internal_Element_Kinds := Int_Kind (Constraint);
Arg_Node : Node_Id;
begin
Check_Validity
(Constraint, Package_Name & "Discriminant_Associations");
if not (Arg_Kind = A_Discriminant_Constraint) then
Raise_ASIS_Inappropriate_Element
(Diagnosis => Package_Name & "Discriminant_Associations",
Wrong_Kind => Arg_Kind);
end if;
Arg_Node := Node (Constraint);
if Normalized then
return Normalized_Discriminant_Associations (
Constr_Elem => Constraint,
Constr_Node => Arg_Node);
else
return N_To_E_List_New
(List => Constraints (Arg_Node),
Internal_Kind => A_Discriminant_Association,
Starting_Element => Constraint);
end if;
exception
when ASIS_Inappropriate_Element =>
raise;
when ASIS_Failed =>
if Status_Indicator = Unhandled_Exception_Error then
Add_Call_Information
(Argument => Constraint,
Bool_Par => Normalized,
Outer_Call => Package_Name & "Discriminant_Associations");
end if;
raise;
when Ex : others =>
Report_ASIS_Bug
(Query_Name => Package_Name & "Discriminant_Associations",
Ex => Ex,
Arg_Element => Constraint,
Bool_Par_ON => Normalized);
end Discriminant_Associations;
-----------------------------------------------------------------------------
function Component_Subtype_Indication
(Component_Definition : Asis.Definition)
return Asis.Definition
is
Arg_Kind : constant Internal_Element_Kinds :=
Int_Kind (Component_Definition);
Arg_Node : Node_Id;
begin
Check_Validity
(Component_Definition, Package_Name & "Component_Subtype_Indication");
if not (Arg_Kind = A_Component_Definition) then
Raise_ASIS_Inappropriate_Element
(Diagnosis => Package_Name & "Component_Subtype_Indication",
Wrong_Kind => Arg_Kind);
end if;
Arg_Node := Sinfo.Subtype_Indication (R_Node (Component_Definition));
return Node_To_Element_New
(Node => Arg_Node,
Starting_Element => Component_Definition,
Internal_Kind => A_Subtype_Indication);
exception
when ASIS_Inappropriate_Element =>
raise;
when ASIS_Failed =>
if Status_Indicator = Unhandled_Exception_Error then
Add_Call_Information
(Argument => Component_Definition,
Outer_Call => Package_Name & "Component_Subtype_Indication");
end if;
raise;
when Ex : others =>
Report_ASIS_Bug
(Query_Name => Package_Name & "Component_Subtype_Indication",
Ex => Ex,
Arg_Element => Component_Definition);
end Component_Subtype_Indication;
-----------------------------------------------------------------------------
function Discriminants
(Definition : Asis.Definition)
return Asis.Discriminant_Specification_List
is
Arg_Kind : constant Internal_Element_Kinds := Int_Kind (Definition);
Arg_Node : Node_Id;
begin
Check_Validity (Definition, Package_Name & "Discriminations");
if not (Arg_Kind = A_Known_Discriminant_Part) then
Raise_ASIS_Inappropriate_Element
(Diagnosis => Package_Name & "Discriminations",
Wrong_Kind => Arg_Kind);
end if;
Arg_Node := Node (Definition);
return N_To_E_List_New
(List => Discriminant_Specifications (Arg_Node),
Starting_Element => Definition,
Internal_Kind => A_Discriminant_Specification);
exception
when ASIS_Inappropriate_Element =>
raise;
when ASIS_Failed =>
if Status_Indicator = Unhandled_Exception_Error then
Add_Call_Information
(Argument => Definition,
Outer_Call => Package_Name & "Discriminations");
end if;
raise;
when Ex : others =>
Report_ASIS_Bug
(Query_Name => Package_Name & "Discriminations",
Ex => Ex,
Arg_Element => Definition);
end Discriminants;
-----------------------------------------------------------------------------
function Record_Components
(Definition : Asis.Record_Definition;
Include_Pragmas : Boolean := False)
return Asis.Record_Component_List
is
Arg_Kind : constant Internal_Element_Kinds := Int_Kind (Definition);
Arg_Node : Node_Id;
Component_List_Node : Node_Id;
Result_List : List_Id; -- All nodes except the Variant Node
Variant_Part_Node : Node_Id;
begin
Check_Validity
(Definition, Package_Name & "Record_Components");
if not (Arg_Kind = A_Record_Definition or else
Arg_Kind = A_Variant)
then
Raise_ASIS_Inappropriate_Element
(Diagnosis => Package_Name & "Record_Components",
Wrong_Kind => Arg_Kind);
end if;
Arg_Node := Node (Definition);
Component_List_Node := Component_List (Arg_Node);
-- first, we should check the null record case:
if Null_Present (Component_List_Node) then
return Element_List'(1 =>
Node_To_Element_New (Node => Arg_Node,
Starting_Element => Definition,
Internal_Kind => A_Null_Component));
end if;
Result_List := Component_Items (Component_List_Node);
Variant_Part_Node := Variant_Part (Component_List_Node);
if No (Variant_Part_Node) then
return N_To_E_List_New (List => Result_List,
Include_Pragmas => Include_Pragmas,
Starting_Element => Definition);
else
return (
N_To_E_List_New (List => Result_List,
Include_Pragmas => Include_Pragmas,
Starting_Element => Definition)
&
Element_List'(1 =>
Node_To_Element_New (Node => Variant_Part_Node,
Starting_Element => Definition,
Internal_Kind => A_Variant_Part))
);
end if;
exception
when ASIS_Inappropriate_Element =>
raise;
when ASIS_Failed =>
if Status_Indicator = Unhandled_Exception_Error then
Add_Call_Information
(Argument => Definition,
Bool_Par => Include_Pragmas,
Outer_Call => Package_Name & "Record_Components");
end if;
raise;
when Ex : others =>
Report_ASIS_Bug
(Query_Name => Package_Name & "Record_Components",
Ex => Ex,
Arg_Element => Definition,
Bool_Par_ON => Include_Pragmas);
end Record_Components;
------------------------------------------------------------------------------
-- NOT IMPLEMENTED
function Implicit_Components
(Definition : Asis.Record_Definition)
return Asis.Record_Component_List
is
begin
Check_Validity
(Definition, Package_Name & "Implicit_Components");
Not_Implemented_Yet
(Diagnosis => Package_Name & "Implicit_Components");
-- ASIS_Failed is raised, Not_Implemented_Error status is set
return Nil_Element_List; -- to make the code syntactically correct
exception
when ASIS_Inappropriate_Element =>
raise;
when ASIS_Failed =>
if Status_Indicator = Unhandled_Exception_Error then
Add_Call_Information
(Argument => Definition,
Outer_Call => Package_Name & "Implicit_Components");
end if;
raise;
when Ex : others =>
Report_ASIS_Bug
(Query_Name => Package_Name & "Implicit_Components",
Ex => Ex,
Arg_Element => Definition);
end Implicit_Components;
-----------------------------------------------------------------------------
function Discriminant_Direct_Name
(Variant_Part : Asis.Record_Component)
return Asis.Name
is
Arg_Kind : constant Internal_Element_Kinds := Int_Kind (Variant_Part);
Arg_Node : Node_Id;
begin
Check_Validity
(Variant_Part, Package_Name & "Discriminant_Direct_Name");
if not (Arg_Kind = A_Variant_Part) then
Raise_ASIS_Inappropriate_Element
(Diagnosis => Package_Name & "Discriminant_Direct_Name",
Wrong_Kind => Arg_Kind);
end if;
Arg_Node := Node (Variant_Part);
return Node_To_Element_New
(Node => Sinfo.Name (Arg_Node),
Starting_Element => Variant_Part,
Internal_Kind => An_Identifier);
exception
when ASIS_Inappropriate_Element =>
raise;
when ASIS_Failed =>
if Status_Indicator = Unhandled_Exception_Error then
Add_Call_Information
(Argument => Variant_Part,
Outer_Call => Package_Name & "Discriminant_Direct_Name");
end if;
raise;
when Ex : others =>
Report_ASIS_Bug
(Query_Name => Package_Name & "Discriminant_Direct_Name",
Ex => Ex,
Arg_Element => Variant_Part);
end Discriminant_Direct_Name;
-----------------------------------------------------------------------------
function Variants
(Variant_Part : Asis.Record_Component;
Include_Pragmas : Boolean := False)
return Asis.Variant_List
is
Arg_Kind : constant Internal_Element_Kinds := Int_Kind (Variant_Part);
Arg_Node : Node_Id;
begin
Check_Validity (Variant_Part, Package_Name & "Variants");
if not (Arg_Kind = A_Variant_Part) then
Raise_ASIS_Inappropriate_Element
(Diagnosis => Package_Name & "Variants",
Wrong_Kind => Arg_Kind);
end if;
Arg_Node := Node (Variant_Part);
return N_To_E_List_New (List => Variants (Arg_Node),
Include_Pragmas => Include_Pragmas,
Starting_Element => Variant_Part);
exception
when ASIS_Inappropriate_Element =>
raise;
when ASIS_Failed =>
if Status_Indicator = Unhandled_Exception_Error then
Add_Call_Information
(Argument => Variant_Part,
Bool_Par => Include_Pragmas,
Outer_Call => Package_Name & "Variants");
end if;
raise;
when Ex : others =>
Report_ASIS_Bug
(Query_Name => Package_Name & "Variants",
Ex => Ex,
Arg_Element => Variant_Part,
Bool_Par_ON => Include_Pragmas);
end Variants;
-----------------------------------------------------------------------------
function Variant_Choices
(Variant : Asis.Variant)
return Asis.Element_List
is
Arg_Kind : constant Internal_Element_Kinds := Int_Kind (Variant);
Arg_Node : Node_Id;
begin
Check_Validity (Variant, Package_Name & "Variant_Choices");
if not (Arg_Kind = A_Variant) then
Raise_ASIS_Inappropriate_Element
(Diagnosis => Package_Name & "Variant_Choices",
Wrong_Kind => Arg_Kind);
end if;
Arg_Node := Node (Variant);
return Discrete_Choice_Node_To_Element_List
(Choice_List => Discrete_Choices (Arg_Node),
Starting_Element => Variant);
exception
when ASIS_Inappropriate_Element =>
raise;
when ASIS_Failed =>
if Status_Indicator = Unhandled_Exception_Error then
Add_Call_Information
(Argument => Variant,
Outer_Call => Package_Name & "Variant_Choices");
end if;
raise;
when Ex : others =>
Report_ASIS_Bug
(Query_Name => Package_Name & "Variant_Choices",
Ex => Ex,
Arg_Element => Variant);
end Variant_Choices;
------------------------------------------------------------------------------
-- OPEN PROBLEMS:
--
-- 1. Is using of the special list construction function
-- Discrete_Choice_Node_To_Element_List really necessary here? We should
-- try to replace it by non-special (trivial) constructor (all
-- necessary local mapping items for Nodes in the Node List have
-- already been defined - ???).
--
-- IT SEEMS TO BE NOT ONLY OK, BUT REALLY NECESSARY HERE (03.11.95)
------------------------------------------------------------------------------
function Ancestor_Subtype_Indication
(Definition : Asis.Definition)
return Asis.Definition
is
Arg_Kind : constant Internal_Element_Kinds := Int_Kind (Definition);
Arg_Node : Node_Id;
begin
Check_Validity
(Definition, Package_Name & "Ancestor_Subtype_Indication");
if not (Arg_Kind = A_Private_Extension_Definition) then
Raise_ASIS_Inappropriate_Element
(Diagnosis => Package_Name & "Ancestor_Subtype_Indication",
Wrong_Kind => Arg_Kind);
end if;
Arg_Node := Node (Definition);
return Node_To_Element_New
(Node => Sinfo.Subtype_Indication (Arg_Node),
Starting_Element => Definition,
Internal_Kind => A_Subtype_Indication);
exception
when ASIS_Inappropriate_Element =>
raise;
when ASIS_Failed =>
if Status_Indicator = Unhandled_Exception_Error then
Add_Call_Information
(Argument => Definition,
Outer_Call => Package_Name & "Ancestor_Subtype_Indication");
end if;
raise;
when Ex : others =>
Report_ASIS_Bug
(Query_Name => Package_Name & "Ancestor_Subtype_Indication",
Ex => Ex,
Arg_Element => Definition);
end Ancestor_Subtype_Indication;
-----------------------------------------------------------------------------
function Visible_Part_Items
(Definition : Asis.Definition;
Include_Pragmas : Boolean := False)
return Asis.Definition_List
is
Arg_Kind : constant Internal_Element_Kinds := Int_Kind (Definition);
Arg_Node : Node_Id;
begin
Check_Validity (Definition, Package_Name & "Visible_Part_Items");
if not (Arg_Kind = A_Task_Definition or else
Arg_Kind = A_Protected_Definition)
then
Raise_ASIS_Inappropriate_Element
(Package_Name & "Visible_Part_Items",
Wrong_Kind => Arg_Kind);
end if;
Arg_Node := Node (Definition);
return N_To_E_List_New
(List => Visible_Declarations (Arg_Node),
Include_Pragmas => Include_Pragmas,
Starting_Element => Definition);
exception
when ASIS_Inappropriate_Element =>
raise;
when ASIS_Failed =>
if Status_Indicator = Unhandled_Exception_Error then
Add_Call_Information
(Argument => Definition,
Bool_Par => Include_Pragmas,
Outer_Call => Package_Name & "Visible_Part_Items");
end if;
raise;
when Ex : others =>
Report_ASIS_Bug
(Query_Name => Package_Name & "Visible_Part_Items",
Ex => Ex,
Arg_Element => Definition,
Bool_Par_ON => Include_Pragmas);
end Visible_Part_Items;
-----------------------------------------------------------------------------
function Private_Part_Items
(Definition : Asis.Definition;
Include_Pragmas : Boolean := False)
return Asis.Definition_List
is
Arg_Kind : constant Internal_Element_Kinds := Int_Kind (Definition);
Arg_Node : Node_Id;
begin
Check_Validity (Definition, Package_Name & "Private_Part_Items");
if not (Arg_Kind = A_Task_Definition or else
Arg_Kind = A_Protected_Definition)
then
Raise_ASIS_Inappropriate_Element
(Package_Name & "Private_Part_Items",
Wrong_Kind => Arg_Kind);
end if;
Arg_Node := Node (Definition);
return N_To_E_List_New
(List => Private_Declarations (Arg_Node),
Include_Pragmas => Include_Pragmas,
Starting_Element => Definition);
exception
when ASIS_Inappropriate_Element =>
raise;
when ASIS_Failed =>
if Status_Indicator = Unhandled_Exception_Error then
Add_Call_Information
(Argument => Definition,
Bool_Par => Include_Pragmas,
Outer_Call => Package_Name & "Private_Part_Items");
end if;
raise;
when Ex : others =>
Report_ASIS_Bug
(Query_Name => Package_Name & "Private_Part_Items",
Ex => Ex,
Arg_Element => Definition,
Bool_Par_ON => Include_Pragmas);
end Private_Part_Items;
-----------------------------------------------------------------------------
function Is_Private_Present
(Definition : Asis.Definition)
return Boolean
is
Arg_Kind : constant Internal_Element_Kinds := Int_Kind (Definition);
Arg_Node : Node_Id;
begin
Check_Validity (Definition, Package_Name & "Is_Private_Present");
if not (Arg_Kind = A_Task_Definition or else
Arg_Kind = A_Protected_Definition)
then
-- unexpected element
return False;
end if;
Arg_Node := Node (Definition);
return Present (Private_Declarations (Arg_Node));
exception
when ASIS_Inappropriate_Element =>
raise;
when ASIS_Failed =>
if Status_Indicator = Unhandled_Exception_Error then
Add_Call_Information
(Argument => Definition,
Outer_Call => Package_Name & "Is_Private_Present");
end if;
raise;
when Ex : others =>
Report_ASIS_Bug
(Query_Name => Package_Name & "Is_Private_Present",
Ex => Ex,
Arg_Element => Definition);
end Is_Private_Present;
-----------------------------------------------------------------------------
end Asis.Definitions;
|
AdaCore/gpr | Ada | 43 | adb | procedure Capital is
null;
end Capital;
|
hgrodriguez/rp2040_zfp | Ada | 105 | ads | -- Configuration for rp2040_zfp generated by Alire
package rp2040_zfp_Config is
end rp2040_zfp_Config;
|
zrmyers/VulkanAda | Ada | 1,851 | ads | --------------------------------------------------------------------------------
-- MIT License
--
-- Copyright (c) 2021 Zane Myers
--
-- 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.
--------------------------------------------------------------------------------
--------------------------------------------------------------------------------
--< @group Vulkan Math Basic Types
--------------------------------------------------------------------------------
--< @summary
--< This package provides a single precision floating point matrix with 2 rows
--< and 2 columns.
--------------------------------------------------------------------------------
package Vulkan.Math.Dmat2x4.Test is
-- Test Harness for Mat2x4 regression tests
procedure Test_Dmat2x4;
end Vulkan.Math.Dmat2x4.Test;
|
AdaDoom3/wayland_ada_binding | Ada | 3,354 | adb | ------------------------------------------------------------------------------
-- Copyright (C) 2016, AdaCore --
-- --
-- This library is free software; you can redistribute it and/or modify it --
-- under terms of the GNU General Public License as published by the Free --
-- Software Foundation; either version 3, or (at your option) any later --
-- version. This library is distributed in the hope that it will be useful, --
-- but WITHOUT ANY WARRANTY; without even the implied warranty of MERCHAN- --
-- TABILITY or FITNESS FOR A PARTICULAR PURPOSE. --
-- --
-- As a special exception under Section 7 of GPL version 3, you are granted --
-- additional permissions described in the GCC Runtime Library Exception, --
-- version 3.1, as published by the Free Software Foundation. --
-- --
-- You should have received a copy of the GNU General Public License and --
-- a copy of the GCC Runtime Library Exception along with this program; --
-- see the files COPYING3 and COPYING.RUNTIME respectively. If not, see --
-- <http://www.gnu.org/licenses/>. --
-- --
------------------------------------------------------------------------------
pragma Ada_2012;
package body Conts.Vectors.Storage.Bounded with SPARK_Mode => Off is
----------
-- Impl --
----------
package body Impl is
---------------------
-- Release_Element --
---------------------
procedure Release_Element
(Self : in out Container'Class; Index : Count_Type) is
begin
Elements.Release (Self.Nodes (Index));
end Release_Element;
-----------------
-- Set_Element --
-----------------
procedure Set_Element
(Self : in out Container'Class;
Index : Count_Type;
Element : Elements.Stored_Type) is
begin
Self.Nodes (Index) := Element;
end Set_Element;
------------
-- Assign --
------------
procedure Assign
(Self : in out Container'Class;
Source : Container'Class;
Last : Count_Type) is
begin
Copy (Self, Source, Min_Index, Last, Min_Index);
end Assign;
----------
-- Copy --
----------
procedure Copy
(Self : in out Container'Class;
Source : Container'Class;
Source_From, Source_To : Count_Type;
Self_From : Count_Type) is
begin
if Elements.Copyable then
Self.Nodes (Self_From .. Self_From + Source_To - Source_From) :=
Source.Nodes (Source_From .. Source_To);
else
for J in Source_From .. Source_To loop
Self.Nodes (Self_From + J - Source_From) :=
Elements.Copy (Source.Nodes (J));
end loop;
end if;
end Copy;
end Impl;
end Conts.Vectors.Storage.Bounded;
|
reznikmm/matreshka | Ada | 5,316 | adb | ------------------------------------------------------------------------------
-- --
-- Matreshka Project --
-- --
-- XML Processor --
-- --
-- Testsuite Component --
-- --
------------------------------------------------------------------------------
-- --
-- Copyright © 2016, 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.Characters.Wide_Wide_Latin_1;
with League.Holders;
with League.Strings;
with XML.SAX.HTML5_Writers;
with XML.SAX.Simple_Readers;
with XML.SAX.String_Input_Sources;
with XML.SAX.String_Output_Destinations;
with XML.Templates.Processors;
procedure Test_424 is
use type League.Strings.Universal_String;
Source : constant League.Strings.Universal_String
:= League.Strings.To_Universal_String
("<html xmlns='http://www.w3.org/1999/xhtml'"
& " xmlns:mtl='http://forge.ada-ru.org/matreshka/template'>"
& "<body>"
& "<ul>"
& "<mtl:if expression='item is null'>is null"
& "</mtl:if>"
& "<mtl:if expression='item is not null'>is not null"
& "</mtl:if>"
& "</ul>"
& "</body>"
& "</html>");
Expected : constant League.Strings.Universal_String
:= League.Strings.To_Universal_String
("<!DOCTYPE html>"
& Ada.Characters.Wide_Wide_Latin_1.LF
& "<ul>is null</ul>");
Input : aliased XML.SAX.String_Input_Sources.String_Input_Source;
Reader : XML.SAX.Simple_Readers.Simple_Reader;
Processor : aliased XML.Templates.Processors.Template_Processor;
Writer : aliased XML.SAX.HTML5_Writers.HTML5_Writer;
Output : aliased
XML.SAX.String_Output_Destinations.String_Output_Destination;
begin
Reader.Set_Content_Handler (Processor'Unchecked_Access);
Reader.Set_Lexical_Handler (Processor'Unchecked_Access);
Processor.Set_Content_Handler (Writer'Unchecked_Access);
Processor.Set_Lexical_Handler (Writer'Unchecked_Access);
Writer.Set_Output_Destination (Output'Unchecked_Access);
Processor.Set_Parameter
(League.Strings.To_Universal_String ("item"),
League.Holders.Empty_Holder);
Input.Set_String (Source);
Reader.Parse (Input'Unchecked_Access);
if Output.Get_Text /= Expected then
raise Program_Error;
end if;
end Test_424;
|
pombredanne/ravenadm | Ada | 5,838 | ads | -- This file is covered by the Internet Software Consortium (ISC) License
-- Reference: ../License.txt
with Definitions; use Definitions;
with Terminal_Interface.Curses;
package Display is
package TIC renames Terminal_Interface.Curses;
subtype history_origin is String (1 .. 45);
subtype history_elapsed is String (1 .. 8);
subtype history_action is String (1 .. 8);
subtype fivelong is String (1 .. 5);
subtype fld_phase is String (1 .. 12);
subtype fld_origin is String (1 .. 40);
subtype fld_lines is String (1 .. 7);
subtype fld_slavid is String (1 .. 2);
type history_rec is
record
id : builders;
slavid : String (1 .. 2);
run_elapsed : history_elapsed;
action : history_action;
pkg_elapsed : history_elapsed;
origin : history_origin;
established : Boolean := False;
end record;
type summary_rec is
record
Initially : Natural;
Built : Natural;
Failed : Natural;
Ignored : Natural;
Skipped : Natural;
elapsed : history_elapsed;
impulse : Natural;
pkg_hour : Natural;
load : Float;
swap : Float;
end record;
type builder_rec is
record
id : builders;
shutdown : Boolean;
idle : Boolean;
slavid : fld_slavid;
Elapsed : history_elapsed;
LLines : fld_lines;
phase : fld_phase;
origin : fld_origin;
end record;
action_shutdown : constant history_action := "shutdown";
action_skipped : constant history_action := "skipped ";
action_ignored : constant history_action := "ignored ";
action_success : constant history_action := "success ";
action_failure : constant history_action := "failure ";
-- Initialize the curses screen.
-- Returns False if no color support (curses not used at all)
function launch_monitor (num_builders : builders) return Boolean;
-- The build is done, return to the console
procedure terminate_monitor;
-- prints the summary header
procedure summarize (data : summary_rec);
-- Updates the status of a builder (contained in builder_rec)
procedure update_builder (BR : builder_rec);
-- After all the update_builder calls, call refresh to implement
procedure refresh_builder_window;
-- After all the history inserts, call refresh to implement
procedure refresh_history_window;
-- Insert history as builder finishes (shutdown, success, failure);
procedure insert_history (HR : history_rec);
-- Clears and redraws the static portion of builder and summary zones
-- (Realized when the regular zones are refreshed)
procedure set_full_redraw_next_update;
-- Expose helper function that formats float values for www report
function fmtpc (f : Float; percent : Boolean) return fivelong;
private
type palette_rec is
record
palette : TIC.Color_Pair;
attribute : TIC.Character_Attribute_Set;
end record;
type builder_palette is array (builders) of palette_rec;
type cyclic_range is range 1 .. 50;
type dim_history is array (cyclic_range) of history_rec;
type zones is (summary, builder, action);
subtype appline is TIC.Attributed_String (1 .. 79);
history : dim_history;
history_arrow : cyclic_range := cyclic_range'Last;
builders_used : Integer;
app_width : constant TIC.Column_Count := 80;
historyheight : TIC.Line_Position;
zone_summary : TIC.Window;
zone_builders : TIC.Window;
zone_actions : TIC.Window;
viewheight : TIC.Line_Count;
c_standard : TIC.Color_Pair;
c_slave : builder_palette;
c_success : TIC.Color_Pair;
c_failure : TIC.Color_Pair;
c_ignored : TIC.Color_Pair;
c_skipped : TIC.Color_Pair;
c_sumlabel : TIC.Color_Pair;
c_dashes : TIC.Color_Pair;
c_tableheader : TIC.Color_Pair;
c_elapsed : TIC.Color_Pair;
c_origin : TIC.Color_Pair;
c_bldphase : TIC.Color_Pair;
c_shutdown : TIC.Color_Pair;
c_advisory : TIC.Color_Pair;
cursor_vis : TIC.Cursor_Visibility := TIC.Invisible;
normal : constant TIC.Character_Attribute_Set :=
(others => False);
bright : constant TIC.Character_Attribute_Set :=
(Bold_Character => True, others => False);
dimmed : constant TIC.Character_Attribute_Set :=
(Dim_Character => True, others => False);
function launch_summary_zone return Boolean;
function launch_builders_zone return Boolean;
function launch_actions_zone return Boolean;
function inc (X : TIC.Line_Position; by : Integer) return TIC.Line_Position;
function zone_window (zone : zones) return TIC.Window;
function Start_Curses_Mode return Boolean;
function establish_colors return Boolean;
function blank_line return appline;
function shutdown_message return appline;
function emphasis (dimmed : Boolean) return TIC.Character_Attribute_Set;
function custom_message (message : String;
attribute : TIC.Character_Attribute_Set;
pen_color : TIC.Color_Pair) return TIC.Attributed_String;
procedure draw_static_summary_zone;
procedure draw_static_builders_zone;
procedure Scrawl
(zone : zones;
information : TIC.Attributed_String;
at_line : TIC.Line_Position;
at_column : TIC.Column_Position := 0);
procedure Return_To_Text_Mode;
procedure Refresh_Zone (zone : zones);
procedure log_non_curses_exception (message_text : String);
end Display;
|
reznikmm/matreshka | Ada | 6,900 | adb | ------------------------------------------------------------------------------
-- --
-- Matreshka Project --
-- --
-- Open Document Toolkit --
-- --
-- Runtime Library Component --
-- --
------------------------------------------------------------------------------
-- --
-- Copyright © 2014, Vadim Godunko <[email protected]> --
-- All rights reserved. --
-- --
-- Redistribution and use in source and binary forms, with or without --
-- modification, are permitted provided that the following conditions --
-- are met: --
-- --
-- * Redistributions of source code must retain the above copyright --
-- notice, this list of conditions and the following disclaimer. --
-- --
-- * Redistributions in binary form must reproduce the above copyright --
-- notice, this list of conditions and the following disclaimer in the --
-- documentation and/or other materials provided with the distribution. --
-- --
-- * Neither the name of the Vadim Godunko, IE nor the names of its --
-- contributors may be used to endorse or promote products derived from --
-- this software without specific prior written permission. --
-- --
-- THIS SOFTWARE IS PROVIDED BY THE COPYRIGHT HOLDERS AND CONTRIBUTORS --
-- "AS IS" AND ANY EXPRESS OR IMPLIED WARRANTIES, INCLUDING, BUT NOT --
-- LIMITED TO, THE IMPLIED WARRANTIES OF MERCHANTABILITY AND FITNESS FOR --
-- A PARTICULAR PURPOSE ARE DISCLAIMED. IN NO EVENT SHALL THE COPYRIGHT --
-- HOLDER OR CONTRIBUTORS BE LIABLE FOR ANY DIRECT, INDIRECT, INCIDENTAL, --
-- SPECIAL, EXEMPLARY, OR CONSEQUENTIAL DAMAGES (INCLUDING, BUT NOT LIMITED --
-- TO, PROCUREMENT OF SUBSTITUTE GOODS OR SERVICES; LOSS OF USE, DATA, OR --
-- PROFITS; OR BUSINESS INTERRUPTION) HOWEVER CAUSED AND ON ANY THEORY OF --
-- LIABILITY, WHETHER IN CONTRACT, STRICT LIABILITY, OR TORT (INCLUDING --
-- NEGLIGENCE OR OTHERWISE) ARISING IN ANY WAY OUT OF THE USE OF THIS --
-- SOFTWARE, EVEN IF ADVISED OF THE POSSIBILITY OF SUCH DAMAGE. --
-- --
------------------------------------------------------------------------------
-- $Revision$ $Date$
------------------------------------------------------------------------------
with Matreshka.DOM_Documents;
with Matreshka.ODF_String_Constants;
with ODF.DOM.Iterators;
with ODF.DOM.Visitors;
package body Matreshka.ODF_Text.Bookmark_Ref_Elements is
------------
-- Create --
------------
overriding function Create
(Parameters : not null access Matreshka.DOM_Elements.Element_L2_Parameters)
return Text_Bookmark_Ref_Element_Node is
begin
return Self : Text_Bookmark_Ref_Element_Node do
Matreshka.ODF_Text.Constructors.Initialize
(Self'Unchecked_Access,
Parameters.Document,
Matreshka.ODF_String_Constants.Text_Prefix);
end return;
end Create;
----------------
-- Enter_Node --
----------------
overriding procedure Enter_Node
(Self : not null access Text_Bookmark_Ref_Element_Node;
Visitor : in out XML.DOM.Visitors.Abstract_Visitor'Class;
Control : in out XML.DOM.Visitors.Traverse_Control) is
begin
if Visitor in ODF.DOM.Visitors.Abstract_ODF_Visitor'Class then
ODF.DOM.Visitors.Abstract_ODF_Visitor'Class
(Visitor).Enter_Text_Bookmark_Ref
(ODF.DOM.Text_Bookmark_Ref_Elements.ODF_Text_Bookmark_Ref_Access
(Self),
Control);
else
Matreshka.DOM_Elements.Abstract_Element_Node
(Self.all).Enter_Node (Visitor, Control);
end if;
end Enter_Node;
--------------------
-- Get_Local_Name --
--------------------
overriding function Get_Local_Name
(Self : not null access constant Text_Bookmark_Ref_Element_Node)
return League.Strings.Universal_String
is
pragma Unreferenced (Self);
begin
return Matreshka.ODF_String_Constants.Bookmark_Ref_Element;
end Get_Local_Name;
----------------
-- Leave_Node --
----------------
overriding procedure Leave_Node
(Self : not null access Text_Bookmark_Ref_Element_Node;
Visitor : in out XML.DOM.Visitors.Abstract_Visitor'Class;
Control : in out XML.DOM.Visitors.Traverse_Control) is
begin
if Visitor in ODF.DOM.Visitors.Abstract_ODF_Visitor'Class then
ODF.DOM.Visitors.Abstract_ODF_Visitor'Class
(Visitor).Leave_Text_Bookmark_Ref
(ODF.DOM.Text_Bookmark_Ref_Elements.ODF_Text_Bookmark_Ref_Access
(Self),
Control);
else
Matreshka.DOM_Elements.Abstract_Element_Node
(Self.all).Leave_Node (Visitor, Control);
end if;
end Leave_Node;
----------------
-- Visit_Node --
----------------
overriding procedure Visit_Node
(Self : not null access Text_Bookmark_Ref_Element_Node;
Iterator : in out XML.DOM.Visitors.Abstract_Iterator'Class;
Visitor : in out XML.DOM.Visitors.Abstract_Visitor'Class;
Control : in out XML.DOM.Visitors.Traverse_Control) is
begin
if Iterator in ODF.DOM.Iterators.Abstract_ODF_Iterator'Class then
ODF.DOM.Iterators.Abstract_ODF_Iterator'Class
(Iterator).Visit_Text_Bookmark_Ref
(Visitor,
ODF.DOM.Text_Bookmark_Ref_Elements.ODF_Text_Bookmark_Ref_Access
(Self),
Control);
else
Matreshka.DOM_Elements.Abstract_Element_Node
(Self.all).Visit_Node (Iterator, Visitor, Control);
end if;
end Visit_Node;
begin
Matreshka.DOM_Documents.Register_Element
(Matreshka.ODF_String_Constants.Text_URI,
Matreshka.ODF_String_Constants.Bookmark_Ref_Element,
Text_Bookmark_Ref_Element_Node'Tag);
end Matreshka.ODF_Text.Bookmark_Ref_Elements;
|
zhmu/ananas | Ada | 180 | adb | -- { dg-do compile }
package body Addr13 is
procedure Overlay is
Over : Integer with Address => Gen_Obj'Address;
begin
Over := 123;
end Overlay;
end Addr13;
|
reznikmm/matreshka | Ada | 3,597 | 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.Elements.Generic_Hash;
function AMF.DG.Gradients.Hash is
new AMF.Elements.Generic_Hash (DG_Gradient, DG_Gradient_Access);
|
flyx/OpenGLAda | Ada | 406 | ads | -- part of OpenGLAda, (c) 2017 Felix Krause
-- released under the terms of the MIT license, see the file "COPYING"
-- Autogenerated by Generate, do not edit
package GL.API.Shorts is
pragma Preelaborate;
Vertex_Attrib1 : T26;
Vertex_Attrib2 : T27;
Vertex_Attrib2v : T28;
Vertex_Attrib3 : T29;
Vertex_Attrib3v : T30;
Vertex_Attrib4 : T31;
Vertex_Attrib4v : T32;
end GL.API.Shorts;
|
reznikmm/matreshka | Ada | 3,677 | 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 League.Holders.Generic_Enumerations;
package AMF.UML.Holders.Message_Sorts is
new League.Holders.Generic_Enumerations
(AMF.UML.UML_Message_Sort);
pragma Preelaborate (AMF.UML.Holders.Message_Sorts);
|
reznikmm/matreshka | Ada | 3,612 | 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.CMOF.Enumerations.Hash is
new AMF.Elements.Generic_Hash (CMOF_Enumeration, CMOF_Enumeration_Access);
|
reznikmm/matreshka | Ada | 3,615 | ads | ------------------------------------------------------------------------------
-- --
-- Matreshka Project --
-- --
-- Ada Modeling Framework --
-- --
-- Runtime Library Component --
-- --
------------------------------------------------------------------------------
-- --
-- Copyright © 2011-2012, Vadim Godunko <[email protected]> --
-- All rights reserved. --
-- --
-- Redistribution and use in source and binary forms, with or without --
-- modification, are permitted provided that the following conditions --
-- are met: --
-- --
-- * Redistributions of source code must retain the above copyright --
-- notice, this list of conditions and the following disclaimer. --
-- --
-- * Redistributions in binary form must reproduce the above copyright --
-- notice, this list of conditions and the following disclaimer in the --
-- documentation and/or other materials provided with the distribution. --
-- --
-- * Neither the name of the Vadim Godunko, IE nor the names of its --
-- contributors may be used to endorse or promote products derived from --
-- this software without specific prior written permission. --
-- --
-- THIS SOFTWARE IS PROVIDED BY THE COPYRIGHT HOLDERS AND CONTRIBUTORS --
-- "AS IS" AND ANY EXPRESS OR IMPLIED WARRANTIES, INCLUDING, BUT NOT --
-- LIMITED TO, THE IMPLIED WARRANTIES OF MERCHANTABILITY AND FITNESS FOR --
-- A PARTICULAR PURPOSE ARE DISCLAIMED. IN NO EVENT SHALL THE COPYRIGHT --
-- HOLDER OR CONTRIBUTORS BE LIABLE FOR ANY DIRECT, INDIRECT, INCIDENTAL, --
-- SPECIAL, EXEMPLARY, OR CONSEQUENTIAL DAMAGES (INCLUDING, BUT NOT LIMITED --
-- TO, PROCUREMENT OF SUBSTITUTE GOODS OR SERVICES; LOSS OF USE, DATA, OR --
-- PROFITS; OR BUSINESS INTERRUPTION) HOWEVER CAUSED AND ON ANY THEORY OF --
-- LIABILITY, WHETHER IN CONTRACT, STRICT LIABILITY, OR TORT (INCLUDING --
-- NEGLIGENCE OR OTHERWISE) ARISING IN ANY WAY OUT OF THE USE OF THIS --
-- SOFTWARE, EVEN IF ADVISED OF THE POSSIBILITY OF SUCH DAMAGE. --
-- --
------------------------------------------------------------------------------
-- $Revision$ $Date$
------------------------------------------------------------------------------
-- This file is generated, don't edit it.
------------------------------------------------------------------------------
with AMF.Elements.Generic_Hash;
function AMF.UML.Time_Intervals.Hash is
new AMF.Elements.Generic_Hash (UML_Time_Interval, UML_Time_Interval_Access);
|
francesco-bongiovanni/ewok-kernel | Ada | 2,969 | ads | --
-- Copyright 2018 The wookey project team <[email protected]>
-- - Ryad Benadjila
-- - Arnauld Michelizza
-- - Mathieu Renard
-- - Philippe Thierry
-- - Philippe Trebuchet
--
-- Licensed under the Apache License, Version 2.0 (the "License");
-- you may not use this file except in compliance with the License.
-- You may obtain a copy of the License at
--
-- http://www.apache.org/licenses/LICENSE-2.0
--
-- Unless required by applicable law or agreed to in writing, software
-- distributed under the License is distributed on an "AS IS" BASIS,
-- WITHOUT WARRANTIES OR CONDITIONS OF ANY KIND, either express or implied.
-- See the License for the specific language governing permissions and
-- limitations under the License.
--
--
with ada.unchecked_conversion;
with soc.interrupts;
with ewok.tasks_shared;
with ewok.devices_shared;
package ewok.interrupts
with spark_mode => off
is
type t_interrupt_handler_access is access
procedure (frame_a : in ewok.t_stack_frame_access);
type t_interrupt_task_switch_handler_access is access
function (frame_a : ewok.t_stack_frame_access)
return ewok.t_stack_frame_access;
type t_handler_type is (DEFAULT_HANDLER, TASK_SWITCH_HANDLER);
type t_interrupt_cell (htype : t_handler_type := DEFAULT_HANDLER) is record
task_id : ewok.tasks_shared.t_task_id;
device_id : ewok.devices_shared.t_device_id;
count : unsigned_32;
case htype is
when DEFAULT_HANDLER =>
handler : t_interrupt_handler_access;
when TASK_SWITCH_HANDLER =>
task_switch_handler : t_interrupt_task_switch_handler_access;
end case;
end record;
type t_interrupt_cell_access is access all t_interrupt_cell;
interrupt_table : array (soc.interrupts.t_interrupt) of aliased t_interrupt_cell;
function to_system_address is new ada.unchecked_conversion
(t_interrupt_handler_access, system_address);
function to_handler_access is new ada.unchecked_conversion
(system_address, t_interrupt_handler_access);
procedure init;
function is_interrupt_already_used
(interrupt : soc.interrupts.t_interrupt) return boolean;
procedure set_interrupt_handler
(interrupt : in soc.interrupts.t_interrupt;
handler : in t_interrupt_handler_access;
task_id : in ewok.tasks_shared.t_task_id;
device_id : in ewok.devices_shared.t_device_id;
success : out boolean);
procedure set_task_switching_handler
(interrupt : in soc.interrupts.t_interrupt;
handler : in t_interrupt_task_switch_handler_access;
task_id : in ewok.tasks_shared.t_task_id;
device_id : in ewok.devices_shared.t_device_id;
success : out boolean);
function get_device_from_interrupt
(interrupt : soc.interrupts.t_interrupt)
return ewok.devices_shared.t_device_id;
end ewok.interrupts;
|
reznikmm/matreshka | Ada | 6,942 | 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_Number.Number_Style_Elements is
------------
-- Create --
------------
overriding function Create
(Parameters : not null access Matreshka.DOM_Elements.Element_L2_Parameters)
return Number_Number_Style_Element_Node is
begin
return Self : Number_Number_Style_Element_Node do
Matreshka.ODF_Number.Constructors.Initialize
(Self'Unchecked_Access,
Parameters.Document,
Matreshka.ODF_String_Constants.Number_Prefix);
end return;
end Create;
----------------
-- Enter_Node --
----------------
overriding procedure Enter_Node
(Self : not null access Number_Number_Style_Element_Node;
Visitor : in out XML.DOM.Visitors.Abstract_Visitor'Class;
Control : in out XML.DOM.Visitors.Traverse_Control) is
begin
if Visitor in ODF.DOM.Visitors.Abstract_ODF_Visitor'Class then
ODF.DOM.Visitors.Abstract_ODF_Visitor'Class
(Visitor).Enter_Number_Number_Style
(ODF.DOM.Number_Number_Style_Elements.ODF_Number_Number_Style_Access
(Self),
Control);
else
Matreshka.DOM_Elements.Abstract_Element_Node
(Self.all).Enter_Node (Visitor, Control);
end if;
end Enter_Node;
--------------------
-- Get_Local_Name --
--------------------
overriding function Get_Local_Name
(Self : not null access constant Number_Number_Style_Element_Node)
return League.Strings.Universal_String
is
pragma Unreferenced (Self);
begin
return Matreshka.ODF_String_Constants.Number_Style_Element;
end Get_Local_Name;
----------------
-- Leave_Node --
----------------
overriding procedure Leave_Node
(Self : not null access Number_Number_Style_Element_Node;
Visitor : in out XML.DOM.Visitors.Abstract_Visitor'Class;
Control : in out XML.DOM.Visitors.Traverse_Control) is
begin
if Visitor in ODF.DOM.Visitors.Abstract_ODF_Visitor'Class then
ODF.DOM.Visitors.Abstract_ODF_Visitor'Class
(Visitor).Leave_Number_Number_Style
(ODF.DOM.Number_Number_Style_Elements.ODF_Number_Number_Style_Access
(Self),
Control);
else
Matreshka.DOM_Elements.Abstract_Element_Node
(Self.all).Leave_Node (Visitor, Control);
end if;
end Leave_Node;
----------------
-- Visit_Node --
----------------
overriding procedure Visit_Node
(Self : not null access Number_Number_Style_Element_Node;
Iterator : in out XML.DOM.Visitors.Abstract_Iterator'Class;
Visitor : in out XML.DOM.Visitors.Abstract_Visitor'Class;
Control : in out XML.DOM.Visitors.Traverse_Control) is
begin
if Iterator in ODF.DOM.Iterators.Abstract_ODF_Iterator'Class then
ODF.DOM.Iterators.Abstract_ODF_Iterator'Class
(Iterator).Visit_Number_Number_Style
(Visitor,
ODF.DOM.Number_Number_Style_Elements.ODF_Number_Number_Style_Access
(Self),
Control);
else
Matreshka.DOM_Elements.Abstract_Element_Node
(Self.all).Visit_Node (Iterator, Visitor, Control);
end if;
end Visit_Node;
begin
Matreshka.DOM_Documents.Register_Element
(Matreshka.ODF_String_Constants.Number_URI,
Matreshka.ODF_String_Constants.Number_Style_Element,
Number_Number_Style_Element_Node'Tag);
end Matreshka.ODF_Number.Number_Style_Elements;
|
onox/orka | Ada | 3,688 | ads | -- 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.Containers.Indefinite_Hashed_Maps;
with Ada.Streams;
with Ada.Strings.Hash;
with GL.Low_Level.Enums;
with GL.Objects.Textures;
with GL.Pixels;
with Orka.Resources;
private package Orka.KTX is
pragma Preelaborate;
package String_Maps is new Ada.Containers.Indefinite_Hashed_Maps
(Key_Type => String,
Element_Type => String,
Hash => Ada.Strings.Hash,
Equivalent_Keys => "=");
use GL.Low_Level.Enums;
type Header (Compressed : Boolean) is record
Kind : GL.Low_Level.Enums.Texture_Kind;
Width : Size;
Height : Size;
Depth : Size;
Array_Elements : Size;
Mipmap_Levels : GL.Objects.Textures.Mipmap_Level;
Bytes_Key_Value : Size;
case Compressed is
when True =>
Compressed_Format : GL.Pixels.Compressed_Format;
when False =>
Data_Type : GL.Pixels.Data_Type;
Format : GL.Pixels.Format;
Internal_Format : GL.Pixels.Internal_Format;
end case;
end record
with Dynamic_Predicate => Header.Width > 0
and not (Header.Height = 0 and Header.Depth > 0)
and (if Header.Compressed then Header.Mipmap_Levels > 0)
and (case Header.Kind is
when Texture_1D | Texture_2D | Texture_3D => Header.Array_Elements = 0,
when Texture_Cube_Map | Texture_Rectangle => Header.Array_Elements = 0,
when others => Header.Array_Elements > 0)
and (case Header.Kind is
when Texture_1D | Texture_1D_Array => Header.Height = 0,
when Texture_2D | Texture_2D_Array => Header.Height > 0 and Header.Depth = 0,
when Texture_Rectangle => Header.Height > 0 and Header.Depth = 0,
when Texture_3D => Header.Depth > 0,
when Texture_Cube_Map => Header.Width = Header.Height and Header.Depth = 0,
when Texture_Cube_Map_Array => Header.Width = Header.Height and Header.Depth = 0,
when others => raise Constraint_Error);
subtype Bytes_Reference is Resources.Byte_Array_Pointers.Constant_Reference;
function Valid_Identifier (Bytes : Bytes_Reference) return Boolean;
function Get_Header (Bytes : Bytes_Reference) return Header;
function Get_Key_Value_Map
(Bytes : Bytes_Reference;
Length : Size) return String_Maps.Map;
function Get_Length
(Bytes : Bytes_Reference;
Offset : Ada.Streams.Stream_Element_Offset) return Natural;
function Get_Data_Offset
(Bytes : Bytes_Reference;
Bytes_Key_Value : Size) return Ada.Streams.Stream_Element_Offset;
Invalid_Enum_Error : exception;
function Create_KTX_Bytes
(KTX_Header : Header;
Get_Data : not null access function (Level : GL.Objects.Textures.Mipmap_Level)
return Resources.Byte_Array_Pointers.Pointer)
return Resources.Byte_Array_Pointers.Pointer;
end Orka.KTX;
|
AdaCore/Ada_Drivers_Library | Ada | 12,163 | adb | ------------------------------------------------------------------------------
-- --
-- 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 STMicroelectronics nor the names of its --
-- contributors may be used to endorse or promote products derived --
-- from this software without specific prior written permission. --
-- --
-- THIS SOFTWARE IS PROVIDED BY THE COPYRIGHT HOLDERS AND CONTRIBUTORS --
-- "AS IS" AND ANY EXPRESS OR IMPLIED WARRANTIES, INCLUDING, BUT NOT --
-- LIMITED TO, THE IMPLIED WARRANTIES OF MERCHANTABILITY AND FITNESS FOR --
-- A PARTICULAR PURPOSE ARE DISCLAIMED. IN NO EVENT SHALL THE COPYRIGHT --
-- HOLDER OR CONTRIBUTORS BE LIABLE FOR ANY DIRECT, INDIRECT, INCIDENTAL, --
-- SPECIAL, EXEMPLARY, OR CONSEQUENTIAL DAMAGES (INCLUDING, BUT NOT --
-- LIMITED TO, PROCUREMENT OF SUBSTITUTE GOODS OR SERVICES; LOSS OF USE, --
-- DATA, OR PROFITS; OR BUSINESS INTERRUPTION) HOWEVER CAUSED AND ON ANY --
-- THEORY OF LIABILITY, WHETHER IN CONTRACT, STRICT LIABILITY, OR TORT --
-- (INCLUDING NEGLIGENCE OR OTHERWISE) ARISING IN ANY WAY OUT OF THE USE --
-- OF THIS SOFTWARE, EVEN IF ADVISED OF THE POSSIBILITY OF SUCH DAMAGE. --
-- --
-- This file is based on: --
-- @file stm32f469i_discovery_audio.c --
-- @author MCD Application Team --
------------------------------------------------------------------------------
with Ada.Real_Time; use Ada.Real_Time;
with HAL; use HAL;
with STM32; use STM32;
with STM32.Board; use STM32.Board;
with STM32.Device; use STM32.Device;
with STM32.GPIO; use STM32.GPIO;
with STM32.DMA; use STM32.DMA;
with STM32.SAI; use STM32.SAI;
with STM32.Setup;
package body Audio is
SAI1_MCLK_A : GPIO_Point renames PG7;
SAI1_SCK_A : GPIO_Point renames PE5;
SAI1_SD_A : GPIO_Point renames PE6;
SAI1_FS_A : GPIO_Point renames PE4;
SAI_Pins : constant GPIO_Points :=
(SAI1_MCLK_A, SAI1_SCK_A, SAI1_SD_A,
SAI1_FS_A);
SAI_Pins_AF : GPIO_Alternate_Function renames GPIO_AF_SAI1_6;
Audio_Reset_Pin : GPIO_Point renames PE2;
-- SAI in/out conf
SAI_Out_Block : SAI_Block renames Block_A;
procedure Set_Audio_Clock (Freq : Audio_Frequency);
procedure Initialize_Audio_Out_Pins;
procedure Initialize_SAI_Out (Freq : Audio_Frequency);
procedure Initialize_Audio_I2C;
procedure Reset
(This : in out CS43L22_Audio_Device);
---------------------
-- Set_Audio_Clock --
---------------------
procedure Set_Audio_Clock (Freq : Audio_Frequency)
is
begin
-- Two groups of frequencies: the 44kHz family and the 48kHz family
-- The Actual audio frequency is calculated then with the following
-- formula:
-- Master_Clock = 256 * FS = SAI_CK / Master_Clock_Divider
-- We need to find a value of SAI_CK that allows such integer master
-- clock divider
case Freq is
when Audio_Freq_11kHz | Audio_Freq_22kHz |
Audio_Freq_32kHz | Audio_Freq_44kHz =>
-- HSE/PLLM = 1MHz = PLLI2S VCO Input
Configure_SAI_I2S_Clock
(Audio_SAI,
PLLI2SN => 429, -- VCO Output = 429MHz
PLLI2SQ => 2, -- SAI Clk(First level) = 214.5 MHz
PLLI2SDIVQ => 19); -- I2S Clk = 215.4 / 19 = 11.289 MHz
when Audio_Freq_8kHz | Audio_Freq_16kHz |
Audio_Freq_48kHz | Audio_Freq_96kHz =>
Configure_SAI_I2S_Clock
(Audio_SAI,
PLLI2SN => 344, -- VCO Output = 344MHz
PLLI2SQ => 7, -- SAI Clk(First level) = 49.142 MHz
PLLI2SDIVQ => 1); -- I2S Clk = 49.142 MHz
end case;
end Set_Audio_Clock;
-------------------------------
-- Initialize_Audio_Out_Pins --
-------------------------------
procedure Initialize_Audio_Out_Pins
is
begin
Enable_Clock (Audio_Reset_Pin);
Configure_IO
(Audio_Reset_Pin,
(Mode => Mode_Out,
Output_Type => Push_Pull,
Speed => Speed_High,
Resistors => Floating));
Set (Audio_Reset_Pin);
Enable_Clock (Audio_SAI);
Enable_Clock (SAI_Pins);
Configure_IO
(SAI_Pins,
(Mode => Mode_AF,
AF => SAI_Pins_AF,
AF_Output_Type => Push_Pull,
AF_Speed => Speed_High,
Resistors => Floating));
Enable_Clock (Audio_DMA);
-- Configure the DMA channel to the SAI peripheral
Disable (Audio_DMA, Audio_DMA_Out_Stream);
Configure
(Audio_DMA,
Audio_DMA_Out_Stream,
(Channel => Audio_DMA_Out_Channel,
Direction => Memory_To_Peripheral,
Increment_Peripheral_Address => False,
Increment_Memory_Address => True,
Peripheral_Data_Format => HalfWords,
Memory_Data_Format => HalfWords,
Operation_Mode => Circular_Mode,
Priority => Priority_High,
FIFO_Enabled => True,
FIFO_Threshold => FIFO_Threshold_Full_Configuration,
Memory_Burst_Size => Memory_Burst_Single,
Peripheral_Burst_Size => Peripheral_Burst_Single));
Clear_All_Status (Audio_DMA, Audio_DMA_Out_Stream);
end Initialize_Audio_Out_Pins;
------------------------
-- Initialize_SAI_Out --
------------------------
procedure Initialize_SAI_Out (Freq : Audio_Frequency)
is
begin
STM32.SAI.Disable (Audio_SAI, SAI_Out_Block);
STM32.SAI.Configure_Audio_Block
(Audio_SAI,
SAI_Out_Block,
Frequency => Audio_Frequency'Enum_Rep (Freq),
Stereo_Mode => Stereo,
Mode => Master_Transmitter,
MCD_Enabled => True,
Protocol => Free_Protocol,
Data_Size => Data_16b,
Endianness => Data_MSB_First,
Clock_Strobing => Clock_Strobing_Falling_Edge,
Synchronization => Asynchronous_Mode,
Output_Drive => Drive_Immediate,
FIFO_Threshold => FIFO_1_Quarter_Full);
STM32.SAI.Configure_Block_Frame
(Audio_SAI,
SAI_Out_Block,
Frame_Length => 64,
Frame_Active => 32,
Frame_Sync => FS_Frame_And_Channel_Identification,
FS_Polarity => FS_Active_Low,
FS_Offset => Before_First_Bit);
STM32.SAI.Configure_Block_Slot
(Audio_SAI,
SAI_Out_Block,
First_Bit_Offset => 0,
Slot_Size => Data_Size,
Number_Of_Slots => 4,
Enabled_Slots => Slot_0 or Slot_2);
STM32.SAI.Enable (Audio_SAI, SAI_Out_Block);
end Initialize_SAI_Out;
--------------------------
-- Initialize_Audio_I2C --
--------------------------
procedure Initialize_Audio_I2C
is
begin
Initialize_I2C_GPIO (Audio_I2C);
STM32.Setup.Setup_I2C_Master (Port => Audio_I2C,
SDA => Audio_I2C_SDA,
SCL => Audio_I2C_SCL,
SDA_AF => Audio_I2C_AF,
SCL_AF => Audio_I2C_AF,
Clock_Speed => 100_000);
end Initialize_Audio_I2C;
----------------
-- Initialize --
----------------
procedure Initialize_Audio_Out
(This : in out CS43L22_Audio_Device;
Volume : Audio_Volume;
Frequency : Audio_Frequency)
is
begin
STM32.SAI.Deinitialize (Audio_SAI, SAI_Out_Block);
Set_Audio_Clock (Frequency);
-- Initialize the SAI
Initialize_Audio_Out_Pins;
Initialize_SAI_Out (Frequency);
-- Initialize the I2C Port to send commands to the driver
Initialize_Audio_I2C;
if This.Device.Read_ID /= CS43L22.CS43L22_ID then
raise Constraint_Error with "Invalid ID received from the Audio Code";
end if;
This.Reset;
This.Device.Init
(Output => CS43L22.Auto,
Volume => UInt8 (Volume),
Frequency =>
HAL.Audio.Audio_Frequency'Enum_Val
(Audio_Frequency'Enum_Rep (Frequency)));
end Initialize_Audio_Out;
-----------
-- Reset --
-----------
procedure Reset (This : in out CS43L22_Audio_Device)
is
pragma Unreferenced (This);
begin
Clear (Audio_Reset_Pin);
delay until Clock + Milliseconds (5);
Set (Audio_Reset_Pin);
delay until Clock + Milliseconds (5);
end Reset;
----------
-- Play --
----------
procedure Play
(This : in out CS43L22_Audio_Device;
Buffer : Audio_Buffer)
is
begin
This.Device.Play;
Start_Transfer_with_Interrupts
(This => Audio_DMA,
Stream => Audio_DMA_Out_Stream,
Source => Buffer (Buffer'First)'Address,
Destination => Audio_SAI.ADR'Address,
Data_Count => Buffer'Length,
Enabled_Interrupts => (Half_Transfer_Complete_Interrupt => True,
Transfer_Complete_Interrupt => True,
others => False));
Enable (Audio_SAI, SAI_Out_Block);
Enable_DMA (Audio_SAI, SAI_Out_Block);
end Play;
-----------
-- Pause --
-----------
procedure Pause (This : in out CS43L22_Audio_Device) is
begin
This.Device.Pause;
DMA_Pause (Audio_SAI, SAI_Out_Block);
end Pause;
------------
-- Resume --
------------
procedure Resume (This : in out CS43L22_Audio_Device)
is
begin
This.Device.Resume;
DMA_Resume (Audio_SAI, SAI_Out_Block);
end Resume;
----------
-- Stop --
----------
procedure Stop (This : in out CS43L22_Audio_Device)
is
begin
This.Device.Stop;
DMA_Stop (Audio_SAI, SAI_Out_Block);
STM32.DMA.Disable (Audio_DMA, Audio_DMA_Out_Stream);
STM32.DMA.Clear_All_Status (Audio_DMA, Audio_DMA_Out_Stream);
end Stop;
----------------
-- Set_Volume --
----------------
procedure Set_Volume
(This : in out CS43L22_Audio_Device;
Volume : Audio_Volume)
is
begin
This.Device.Set_Volume (UInt8 (Volume));
end Set_Volume;
-------------------
-- Set_Frequency --
-------------------
procedure Set_Frequency
(This : in out CS43L22_Audio_Device;
Frequency : Audio_Frequency)
is
pragma Unreferenced (This);
begin
Set_Audio_Clock (Frequency);
STM32.SAI.Disable (Audio_SAI, SAI_Out_Block);
Initialize_SAI_Out (Frequency);
STM32.SAI.Enable (Audio_SAI, SAI_Out_Block);
end Set_Frequency;
end Audio;
|
optikos/oasis | Ada | 2,051 | ads | -- Copyright (c) 2019 Maxim Reznik <[email protected]>
--
-- SPDX-License-Identifier: MIT
-- License-Filename: LICENSE
-------------------------------------------------------------
-- Trivial implementation of library bodies
with Program.Library_Unit_Bodies;
with Program.Library_Unit_Declarations;
with Program.Compilation_Unit_Vectors;
with Program.Units.Vectors;
package Program.Units.Bodies is
pragma Preelaborate;
type Unit_Body is new Unit
and Program.Library_Unit_Bodies.Library_Unit_Body with private;
procedure Initialize
(Self : in out Unit_Body;
Compilation : Program.Compilations.Compilation_Access;
Full_Name : Text;
Context_Clause : Program.Element_Vectors.Element_Vector_Access;
Unit_Declaration : not null Program.Elements.Element_Access;
Parent : Program.Library_Unit_Declarations
.Library_Unit_Declaration_Access;
Declaration : Program.Library_Unit_Declarations
.Library_Unit_Declaration_Access);
procedure Append_Subunit
(Self : in out Unit_Body;
Value : Program.Compilation_Units.Compilation_Unit_Access);
private
type Unit_Body is new Unit
and Program.Library_Unit_Bodies.Library_Unit_Body with
record
Parent : Program.Library_Unit_Declarations
.Library_Unit_Declaration_Access;
Declaration : Program.Library_Unit_Declarations
.Library_Unit_Declaration_Access;
Subunits : aliased Program.Units.Vectors.Unit_Vector;
end record;
overriding function Parent (Self : access Unit_Body)
return Program.Library_Unit_Declarations.Library_Unit_Declaration_Access;
overriding function Corresponding_Declaration (Self : access Unit_Body)
return Program.Library_Unit_Declarations.Library_Unit_Declaration_Access;
overriding function Subunits (Self : access Unit_Body)
return Program.Compilation_Unit_Vectors.Compilation_Unit_Vector_Access;
end Program.Units.Bodies;
|
reznikmm/matreshka | Ada | 7,081 | adb | ------------------------------------------------------------------------------
-- --
-- Matreshka Project --
-- --
-- Open Document Toolkit --
-- --
-- Runtime Library Component --
-- --
------------------------------------------------------------------------------
-- --
-- Copyright © 2014, Vadim Godunko <[email protected]> --
-- All rights reserved. --
-- --
-- Redistribution and use in source and binary forms, with or without --
-- modification, are permitted provided that the following conditions --
-- are met: --
-- --
-- * Redistributions of source code must retain the above copyright --
-- notice, this list of conditions and the following disclaimer. --
-- --
-- * Redistributions in binary form must reproduce the above copyright --
-- notice, this list of conditions and the following disclaimer in the --
-- documentation and/or other materials provided with the distribution. --
-- --
-- * Neither the name of the Vadim Godunko, IE nor the names of its --
-- contributors may be used to endorse or promote products derived from --
-- this software without specific prior written permission. --
-- --
-- THIS SOFTWARE IS PROVIDED BY THE COPYRIGHT HOLDERS AND CONTRIBUTORS --
-- "AS IS" AND ANY EXPRESS OR IMPLIED WARRANTIES, INCLUDING, BUT NOT --
-- LIMITED TO, THE IMPLIED WARRANTIES OF MERCHANTABILITY AND FITNESS FOR --
-- A PARTICULAR PURPOSE ARE DISCLAIMED. IN NO EVENT SHALL THE COPYRIGHT --
-- HOLDER OR CONTRIBUTORS BE LIABLE FOR ANY DIRECT, INDIRECT, INCIDENTAL, --
-- SPECIAL, EXEMPLARY, OR CONSEQUENTIAL DAMAGES (INCLUDING, BUT NOT LIMITED --
-- TO, PROCUREMENT OF SUBSTITUTE GOODS OR SERVICES; LOSS OF USE, DATA, OR --
-- PROFITS; OR BUSINESS INTERRUPTION) HOWEVER CAUSED AND ON ANY THEORY OF --
-- LIABILITY, WHETHER IN CONTRACT, STRICT LIABILITY, OR TORT (INCLUDING --
-- NEGLIGENCE OR OTHERWISE) ARISING IN ANY WAY OUT OF THE USE OF THIS --
-- SOFTWARE, EVEN IF ADVISED OF THE POSSIBILITY OF SUCH DAMAGE. --
-- --
------------------------------------------------------------------------------
-- $Revision$ $Date$
------------------------------------------------------------------------------
with Matreshka.DOM_Documents;
with Matreshka.ODF_String_Constants;
with ODF.DOM.Iterators;
with ODF.DOM.Visitors;
package body Matreshka.ODF_Table.Data_Pilot_Subtotals_Elements is
------------
-- Create --
------------
overriding function Create
(Parameters : not null access Matreshka.DOM_Elements.Element_L2_Parameters)
return Table_Data_Pilot_Subtotals_Element_Node is
begin
return Self : Table_Data_Pilot_Subtotals_Element_Node do
Matreshka.ODF_Table.Constructors.Initialize
(Self'Unchecked_Access,
Parameters.Document,
Matreshka.ODF_String_Constants.Table_Prefix);
end return;
end Create;
----------------
-- Enter_Node --
----------------
overriding procedure Enter_Node
(Self : not null access Table_Data_Pilot_Subtotals_Element_Node;
Visitor : in out XML.DOM.Visitors.Abstract_Visitor'Class;
Control : in out XML.DOM.Visitors.Traverse_Control) is
begin
if Visitor in ODF.DOM.Visitors.Abstract_ODF_Visitor'Class then
ODF.DOM.Visitors.Abstract_ODF_Visitor'Class
(Visitor).Enter_Table_Data_Pilot_Subtotals
(ODF.DOM.Table_Data_Pilot_Subtotals_Elements.ODF_Table_Data_Pilot_Subtotals_Access
(Self),
Control);
else
Matreshka.DOM_Elements.Abstract_Element_Node
(Self.all).Enter_Node (Visitor, Control);
end if;
end Enter_Node;
--------------------
-- Get_Local_Name --
--------------------
overriding function Get_Local_Name
(Self : not null access constant Table_Data_Pilot_Subtotals_Element_Node)
return League.Strings.Universal_String
is
pragma Unreferenced (Self);
begin
return Matreshka.ODF_String_Constants.Data_Pilot_Subtotals_Element;
end Get_Local_Name;
----------------
-- Leave_Node --
----------------
overriding procedure Leave_Node
(Self : not null access Table_Data_Pilot_Subtotals_Element_Node;
Visitor : in out XML.DOM.Visitors.Abstract_Visitor'Class;
Control : in out XML.DOM.Visitors.Traverse_Control) is
begin
if Visitor in ODF.DOM.Visitors.Abstract_ODF_Visitor'Class then
ODF.DOM.Visitors.Abstract_ODF_Visitor'Class
(Visitor).Leave_Table_Data_Pilot_Subtotals
(ODF.DOM.Table_Data_Pilot_Subtotals_Elements.ODF_Table_Data_Pilot_Subtotals_Access
(Self),
Control);
else
Matreshka.DOM_Elements.Abstract_Element_Node
(Self.all).Leave_Node (Visitor, Control);
end if;
end Leave_Node;
----------------
-- Visit_Node --
----------------
overriding procedure Visit_Node
(Self : not null access Table_Data_Pilot_Subtotals_Element_Node;
Iterator : in out XML.DOM.Visitors.Abstract_Iterator'Class;
Visitor : in out XML.DOM.Visitors.Abstract_Visitor'Class;
Control : in out XML.DOM.Visitors.Traverse_Control) is
begin
if Iterator in ODF.DOM.Iterators.Abstract_ODF_Iterator'Class then
ODF.DOM.Iterators.Abstract_ODF_Iterator'Class
(Iterator).Visit_Table_Data_Pilot_Subtotals
(Visitor,
ODF.DOM.Table_Data_Pilot_Subtotals_Elements.ODF_Table_Data_Pilot_Subtotals_Access
(Self),
Control);
else
Matreshka.DOM_Elements.Abstract_Element_Node
(Self.all).Visit_Node (Iterator, Visitor, Control);
end if;
end Visit_Node;
begin
Matreshka.DOM_Documents.Register_Element
(Matreshka.ODF_String_Constants.Table_URI,
Matreshka.ODF_String_Constants.Data_Pilot_Subtotals_Element,
Table_Data_Pilot_Subtotals_Element_Node'Tag);
end Matreshka.ODF_Table.Data_Pilot_Subtotals_Elements;
|
Subsets and Splits
No community queries yet
The top public SQL queries from the community will appear here once available.