repo_name
stringlengths 9
74
| language
stringclasses 1
value | length_bytes
int64 11
9.34M
| extension
stringclasses 2
values | content
stringlengths 11
9.34M
|
---|---|---|---|---|
reznikmm/matreshka | Ada | 4,624 | adb | ------------------------------------------------------------------------------
-- --
-- Matreshka Project --
-- --
-- Web Framework --
-- --
------------------------------------------------------------------------------
-- --
-- Copyright © 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$
------------------------------------------------------------------------------
with AWS.Response;
with League.JSON.Documents;
separate (WebDriver.Remote)
package body Executors is
-------------
-- Execute --
-------------
not overriding function Execute
(Self : access HTTP_Command_Executor;
Command : Remote.Command) return Response
is
Reply : AWS.Response.Data;
JSON : League.JSON.Documents.JSON_Document;
begin
case Command.Method is
when Get =>
AWS.Client.Get
(Self.Server,
URI => Command.Path.To_UTF_8_String,
Result => Reply);
when Post =>
declare
Text : constant League.Strings.Universal_String :=
Command.Parameters.To_JSON_Document.To_JSON;
begin
AWS.Client.Post
(Self.Server,
URI => Command.Path.To_UTF_8_String,
Data => Text.To_UTF_8_String,
Content_Type => "application/json; charset=utf-8",
Result => Reply);
end;
end case;
JSON := League.JSON.Documents.From_JSON
(AWS.Response.Message_Body (Reply));
return
(Session_Id => League.Strings.Empty_Universal_String, -- FIXME
State => League.Strings.Empty_Universal_String, -- FIXME
Status => 0, -- FIXME
Value => JSON.To_JSON_Object);
end Execute;
end Executors;
|
reznikmm/matreshka | Ada | 4,655 | adb | ------------------------------------------------------------------------------
-- --
-- Matreshka Project --
-- --
-- Open Document Toolkit --
-- --
-- Runtime Library Component --
-- --
------------------------------------------------------------------------------
-- --
-- Copyright © 2014, Vadim Godunko <[email protected]> --
-- All rights reserved. --
-- --
-- Redistribution and use in source and binary forms, with or without --
-- modification, are permitted provided that the following conditions --
-- are met: --
-- --
-- * Redistributions of source code must retain the above copyright --
-- notice, this list of conditions and the following disclaimer. --
-- --
-- * Redistributions in binary form must reproduce the above copyright --
-- notice, this list of conditions and the following disclaimer in the --
-- documentation and/or other materials provided with the distribution. --
-- --
-- * Neither the name of the Vadim Godunko, IE nor the names of its --
-- contributors may be used to endorse or promote products derived from --
-- this software without specific prior written permission. --
-- --
-- THIS SOFTWARE IS PROVIDED BY THE COPYRIGHT HOLDERS AND CONTRIBUTORS --
-- "AS IS" AND ANY EXPRESS OR IMPLIED WARRANTIES, INCLUDING, BUT NOT --
-- LIMITED TO, THE IMPLIED WARRANTIES OF MERCHANTABILITY AND FITNESS FOR --
-- A PARTICULAR PURPOSE ARE DISCLAIMED. IN NO EVENT SHALL THE COPYRIGHT --
-- HOLDER OR CONTRIBUTORS BE LIABLE FOR ANY DIRECT, INDIRECT, INCIDENTAL, --
-- SPECIAL, EXEMPLARY, OR CONSEQUENTIAL DAMAGES (INCLUDING, BUT NOT LIMITED --
-- TO, PROCUREMENT OF SUBSTITUTE GOODS OR SERVICES; LOSS OF USE, DATA, OR --
-- PROFITS; OR BUSINESS INTERRUPTION) HOWEVER CAUSED AND ON ANY THEORY OF --
-- LIABILITY, WHETHER IN CONTRACT, STRICT LIABILITY, OR TORT (INCLUDING --
-- NEGLIGENCE OR OTHERWISE) ARISING IN ANY WAY OUT OF THE USE OF THIS --
-- SOFTWARE, EVEN IF ADVISED OF THE POSSIBILITY OF SUCH DAMAGE. --
-- --
------------------------------------------------------------------------------
-- $Revision$ $Date$
------------------------------------------------------------------------------
with Matreshka.DOM_Documents;
with Matreshka.ODF_String_Constants;
with ODF.DOM.Iterators;
with ODF.DOM.Visitors;
package body Matreshka.ODF_Draw.Escape_Direction_Attributes is
------------
-- Create --
------------
overriding function Create
(Parameters : not null access Matreshka.DOM_Attributes.Attribute_L2_Parameters)
return Draw_Escape_Direction_Attribute_Node is
begin
return Self : Draw_Escape_Direction_Attribute_Node do
Matreshka.ODF_Draw.Constructors.Initialize
(Self'Unchecked_Access,
Parameters.Document,
Matreshka.ODF_String_Constants.Draw_Prefix);
end return;
end Create;
--------------------
-- Get_Local_Name --
--------------------
overriding function Get_Local_Name
(Self : not null access constant Draw_Escape_Direction_Attribute_Node)
return League.Strings.Universal_String
is
pragma Unreferenced (Self);
begin
return Matreshka.ODF_String_Constants.Escape_Direction_Attribute;
end Get_Local_Name;
begin
Matreshka.DOM_Documents.Register_Attribute
(Matreshka.ODF_String_Constants.Draw_URI,
Matreshka.ODF_String_Constants.Escape_Direction_Attribute,
Draw_Escape_Direction_Attribute_Node'Tag);
end Matreshka.ODF_Draw.Escape_Direction_Attributes;
|
reznikmm/matreshka | Ada | 4,636 | 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$
------------------------------------------------------------------------------
-- Factory for DD module.
------------------------------------------------------------------------------
package AMF.Internals.Factories.DD_Module_Factory is
type DD_Module_Factory is
limited new AMF.Internals.Factories.Abstract_Module_Factory
with null record;
------------------------------
-- AMF_Factory's operations --
------------------------------
overriding procedure Connect_Extent
(Self : not null access constant DD_Module_Factory;
Element : AMF.Internals.AMF_Element;
Extent : AMF.Internals.AMF_Extent);
overriding procedure Connect_Link_End
(Self : not null access constant DD_Module_Factory;
Element : AMF.Internals.AMF_Element;
Property : AMF.Internals.CMOF_Element;
Link : AMF.Internals.AMF_Link;
Other : AMF.Internals.AMF_Element);
overriding procedure Synchronize_Link_Set
(Self : not null access constant DD_Module_Factory;
Element : AMF.Internals.AMF_Element;
Property : AMF.Internals.CMOF_Element;
Link : AMF.Internals.AMF_Link);
overriding function To_Element
(Self : not null access constant DD_Module_Factory;
Element : AMF.Internals.AMF_Element) return AMF.Elements.Element_Access;
end AMF.Internals.Factories.DD_Module_Factory;
|
Fabien-Chouteau/Ada_Drivers_Library | Ada | 3,883 | adb | ------------------------------------------------------------------------------
-- --
-- Copyright (C) 2015-2016, AdaCore --
-- --
-- Redistribution and use in source and binary forms, with or without --
-- modification, are permitted provided that the following conditions are --
-- met: --
-- 1. Redistributions of source code must retain the above copyright --
-- notice, this list of conditions and the following disclaimer. --
-- 2. Redistributions in binary form must reproduce the above copyright --
-- notice, this list of conditions and the following disclaimer in --
-- the documentation and/or other materials provided with the --
-- distribution. --
-- 3. Neither the name of the copyright holder nor the names of its --
-- contributors may be used to endorse or promote products derived --
-- from this software without specific prior written permission. --
-- --
-- THIS SOFTWARE IS PROVIDED BY THE COPYRIGHT HOLDERS AND CONTRIBUTORS --
-- "AS IS" AND ANY EXPRESS OR IMPLIED WARRANTIES, INCLUDING, BUT NOT --
-- LIMITED TO, THE IMPLIED WARRANTIES OF MERCHANTABILITY AND FITNESS FOR --
-- A PARTICULAR PURPOSE ARE DISCLAIMED. IN NO EVENT SHALL THE COPYRIGHT --
-- HOLDER OR CONTRIBUTORS BE LIABLE FOR ANY DIRECT, INDIRECT, INCIDENTAL, --
-- SPECIAL, EXEMPLARY, OR CONSEQUENTIAL DAMAGES (INCLUDING, BUT NOT --
-- LIMITED TO, PROCUREMENT OF SUBSTITUTE GOODS OR SERVICES; LOSS OF USE, --
-- DATA, OR PROFITS; OR BUSINESS INTERRUPTION) HOWEVER CAUSED AND ON ANY --
-- THEORY OF LIABILITY, WHETHER IN CONTRACT, STRICT LIABILITY, OR TORT --
-- (INCLUDING NEGLIGENCE OR OTHERWISE) ARISING IN ANY WAY OUT OF THE USE --
-- OF THIS SOFTWARE, EVEN IF ADVISED OF THE POSSIBILITY OF SUCH DAMAGE. --
-- --
------------------------------------------------------------------------------
-- A demonstration of a higher-level USART interface, using non-blocking I/O.
-- The file declares the main procedure for the demonstration.
with Last_Chance_Handler; pragma Unreferenced (Last_Chance_Handler);
-- The "last chance handler" is the user-defined routine that is called when
-- an exception is propagated. We need it in the executable, therefore it
-- must be somewhere in the closure of the context clauses.
with Peripherals_Nonblocking; use Peripherals_Nonblocking;
with Serial_IO.Nonblocking; use Serial_IO.Nonblocking;
with Message_Buffers; use Message_Buffers;
procedure Demo_Serial_Port_Nonblocking is
Incoming : aliased Message (Physical_Size => 1024); -- arbitrary size
procedure Send (This : String);
procedure Send (This : String) is
Outgoing : aliased Message (Physical_Size => 1024); -- arbitrary size
begin
Set (Outgoing, To => This);
Put (COM, Outgoing'Unchecked_Access);
Await_Transmission_Complete (Outgoing);
-- We must await xmit completion because Put does not wait
end Send;
begin
Initialize (COM);
Configure (COM, Baud_Rate => 115_200);
Send ("Enter text, terminated by CR.");
Set_Terminator (Incoming, To => ASCII.CR);
loop
Get (COM, Incoming'Unchecked_Access);
Await_Reception_Complete (Incoming);
-- We must await reception completion because Get does not wait
Send ("Received : " & Content (Incoming));
end loop;
end Demo_Serial_Port_Nonblocking;
|
zhmu/ananas | Ada | 30,042 | ads | ------------------------------------------------------------------------------
-- --
-- GNAT LIBRARY COMPONENTS --
-- --
-- S Y S T E M . R E G P A T --
-- --
-- S p e c --
-- --
-- Copyright (C) 1986 by University of Toronto. --
-- Copyright (C) 1996-2022, AdaCore --
-- --
-- GNAT is free software; you can redistribute it and/or modify it under --
-- terms of the GNU General Public License as published by the Free Soft- --
-- ware Foundation; either version 3, or (at your option) any later ver- --
-- sion. GNAT is distributed in the hope that it will be useful, but WITH- --
-- OUT ANY WARRANTY; without even the implied warranty of MERCHANTABILITY --
-- or FITNESS FOR A PARTICULAR PURPOSE. --
-- --
-- As a special exception under Section 7 of GPL version 3, you are granted --
-- additional permissions described in the GCC Runtime Library Exception, --
-- version 3.1, as published by the Free Software Foundation. --
-- --
-- You should have received a copy of the GNU General Public License and --
-- a copy of the GCC Runtime Library Exception along with this program; --
-- see the files COPYING3 and COPYING.RUNTIME respectively. If not, see --
-- <http://www.gnu.org/licenses/>. --
-- --
-- GNAT was originally developed by the GNAT team at New York University. --
-- Extensive contributions were provided by Ada Core Technologies Inc. --
-- --
------------------------------------------------------------------------------
-- This package implements roughly the same set of regular expressions as
-- are available in the Perl or Python programming languages.
-- This is an extension of the original V7 style regular expression library
-- written in C by Henry Spencer. Apart from the translation to Ada, the
-- interface has been considerably changed to use the Ada String type
-- instead of C-style nul-terminated strings.
-- Note: this package is in the System hierarchy so that it can be directly
-- be used by other predefined packages. User access to this package is via
-- a renaming of this package in GNAT.Regpat (file g-regpat.ads).
package System.Regpat is
pragma Preelaborate;
-- The grammar is the following:
-- regexp ::= expr
-- ::= ^ expr -- anchor at the beginning of string
-- ::= expr $ -- anchor at the end of string
-- expr ::= term
-- ::= term | term -- alternation (term or term ...)
-- term ::= item
-- ::= item item ... -- concatenation (item then item)
-- item ::= elmt -- match elmt
-- ::= elmt * -- zero or more elmt's
-- ::= elmt + -- one or more elmt's
-- ::= elmt ? -- matches elmt or nothing
-- ::= elmt *? -- zero or more times, minimum number
-- ::= elmt +? -- one or more times, minimum number
-- ::= elmt ?? -- zero or one time, minimum number
-- ::= elmt { num } -- matches elmt exactly num times
-- ::= elmt { num , } -- matches elmt at least num times
-- ::= elmt { num , num2 } -- matches between num and num2 times
-- ::= elmt { num }? -- matches elmt exactly num times
-- ::= elmt { num , }? -- matches elmt at least num times
-- non-greedy version
-- ::= elmt { num , num2 }? -- matches between num and num2 times
-- non-greedy version
-- elmt ::= nchr -- matches given character
-- ::= [range range ...] -- matches any character listed
-- ::= [^ range range ...] -- matches any character not listed
-- ::= . -- matches any single character
-- -- except newlines
-- ::= ( expr ) -- parenthesis used for grouping
-- ::= (?: expr ) -- non-capturing parenthesis
-- ::= \ num -- reference to num-th capturing
-- parenthesis
-- range ::= char - char -- matches chars in given range
-- ::= nchr
-- ::= [: posix :] -- any character in the POSIX range
-- ::= [:^ posix :] -- not in the POSIX range
-- posix ::= alnum -- alphanumeric characters
-- ::= alpha -- alphabetic characters
-- ::= ascii -- ascii characters (0 .. 127)
-- ::= cntrl -- control chars (0..31, 127..159)
-- ::= digit -- digits ('0' .. '9')
-- ::= graph -- graphic chars (32..126, 160..255)
-- ::= lower -- lower case characters
-- ::= print -- printable characters (32..127)
-- -- and whitespaces (9 .. 13)
-- ::= punct -- printable, except alphanumeric
-- ::= space -- space characters
-- ::= upper -- upper case characters
-- ::= word -- alphanumeric characters
-- ::= xdigit -- hexadecimal chars (0..9, a..f)
-- char ::= any character, including special characters
-- ASCII.NUL is not supported.
-- nchr ::= any character except \()[].*+?^ or \char to match char
-- \n means a newline (ASCII.LF)
-- \t means a tab (ASCII.HT)
-- \r means a return (ASCII.CR)
-- \b matches the empty string at the beginning or end of a
-- word. A word is defined as a set of alphanumerical
-- characters (see \w below).
-- \B matches the empty string only when *not* at the
-- beginning or end of a word.
-- \d matches any digit character ([0-9])
-- \D matches any non digit character ([^0-9])
-- \s matches any white space character. This is equivalent
-- to [ \t\n\r\f\v] (tab, form-feed, vertical-tab,...
-- \S matches any non-white space character.
-- \w matches any alphanumeric character or underscore.
-- This include accented letters, as defined in the
-- package Ada.Characters.Handling.
-- \W matches any non-alphanumeric character.
-- \A match the empty string only at the beginning of the
-- string, whatever flags are used for Compile (the
-- behavior of ^ can change, see Regexp_Flags below).
-- \G match the empty string only at the end of the
-- string, whatever flags are used for Compile (the
-- behavior of $ can change, see Regexp_Flags below).
-- ... ::= is used to indication repetition (one or more terms)
-- Embedded newlines are not matched by the ^ operator.
-- It is possible to retrieve the substring matched a parenthesis
-- expression. Although the depth of parenthesis is not limited in the
-- regexp, only the first 9 substrings can be retrieved.
-- The highest value possible for the arguments to the curly operator ({})
-- are given by the constant Max_Curly_Repeat below.
-- The operators '*', '+', '?' and '{}' always match the longest possible
-- substring. They all have a non-greedy version (with an extra ? after the
-- operator), which matches the shortest possible substring.
-- For instance:
-- regexp="<.*>" string="<h1>title</h1>" matches="<h1>title</h1>"
-- regexp="<.*?>" string="<h1>title</h1>" matches="<h1>"
--
-- '{' and '}' are only considered as special characters if they appear
-- in a substring that looks exactly like '{n}', '{n,m}' or '{n,}', where
-- n and m are digits. No space is allowed. In other contexts, the curly
-- braces will simply be treated as normal characters.
-- Compiling Regular Expressions
-- =============================
-- To use this package, you first need to compile the regular expression
-- (a string) into a byte-code program, in a Pattern_Matcher structure.
-- This first step checks that the regexp is valid, and optimizes the
-- matching algorithms of the second step.
-- Two versions of the Compile subprogram are given: one in which this
-- package will compute itself the best possible size to allocate for the
-- byte code; the other where you must allocate enough memory yourself. An
-- exception is raised if there is not enough memory.
-- declare
-- Regexp : String := "a|b";
-- Matcher : Pattern_Matcher := Compile (Regexp);
-- -- The size for matcher is automatically allocated
-- Matcher2 : Pattern_Matcher (1000);
-- -- Some space is allocated directly.
-- begin
-- Compile (Matcher2, Regexp);
-- ...
-- end;
-- Note that the second version is significantly faster, since with the
-- first version the regular expression has in fact to be compiled twice
-- (first to compute the size, then to generate the byte code).
-- Note also that you cannot use the function version of Compile if you
-- specify the size of the Pattern_Matcher, since the discriminants will
-- most probably be different and you will get a Constraint_Error
-- Matching Strings
-- ================
-- Once the regular expression has been compiled, you can use it as often
-- as needed to match strings.
-- Several versions of the Match subprogram are provided, with different
-- parameters and return results.
-- See the description under each of these subprograms
-- Here is a short example showing how to get the substring matched by
-- the first parenthesis pair.
-- declare
-- Matches : Match_Array (0 .. 1);
-- Regexp : String := "a(b|c)d";
-- Str : String := "gacdg";
-- begin
-- Match (Compile (Regexp), Str, Matches);
-- return Str (Matches (1).First .. Matches (1).Last);
-- -- returns 'c'
-- end;
-- Finding all occurrences
-- =======================
-- Finding all the occurrences of a regular expression in a string cannot
-- be done by simply passing a slice of the string. This wouldn't work for
-- anchored regular expressions (the ones starting with "^" or ending with
-- "$").
-- Instead, you need to use the last parameter to Match (Data_First), as in
-- the following loop:
-- declare
-- Str : String :=
-- "-- first line" & ASCII.LF & "-- second line";
-- Matches : Match_Array (0 .. 0);
-- Regexp : Pattern_Matcher := Compile ("^--", Multiple_Lines);
-- Current : Natural := Str'First;
-- begin
-- loop
-- Match (Regexp, Str, Matches, Current);
-- exit when Matches (0) = No_Match;
--
-- -- Process the match at position Matches (0).First
--
-- Current := Matches (0).Last + 1;
-- end loop;
-- end;
-- String Substitution
-- ===================
-- No subprogram is currently provided for string substitution.
-- However, this is easy to simulate with the parenthesis groups, as
-- shown below.
-- This example swaps the first two words of the string:
-- declare
-- Regexp : String := "([a-z]+) +([a-z]+)";
-- Str : String := " first second third ";
-- Matches : Match_Array (0 .. 2);
-- begin
-- Match (Compile (Regexp), Str, Matches);
-- return Str (Str'First .. Matches (1).First - 1)
-- & Str (Matches (2).First .. Matches (2).Last)
-- & " "
-- & Str (Matches (1).First .. Matches (1).Last)
-- & Str (Matches (2).Last + 1 .. Str'Last);
-- -- returns " second first third "
-- end;
---------------
-- Constants --
---------------
Expression_Error : exception;
-- This exception is raised when trying to compile an invalid regular
-- expression. All subprograms taking an expression as parameter may raise
-- Expression_Error.
Max_Paren_Count : constant := 255;
-- Maximum number of parenthesis in a regular expression. This is limited
-- by the size of a Character, as found in the byte-compiled version of
-- regular expressions.
Max_Curly_Repeat : constant := 32767;
-- Maximum number of repetition for the curly operator. The digits in the
-- {n}, {n,} and {n,m } operators cannot be higher than this constant,
-- since they have to fit on two characters in the byte-compiled version of
-- regular expressions.
Max_Program_Size : constant := 2**15 - 1;
-- Maximum size that can be allocated for a program
type Program_Size is range 0 .. Max_Program_Size;
for Program_Size'Size use 16;
-- Number of bytes allocated for the byte-compiled version of a regular
-- expression. The size required depends on the complexity of the regular
-- expression in a complex manner that is undocumented (other than in the
-- body of the Compile procedure). Normally the size is automatically set
-- and the programmer need not be concerned about it. There are two
-- exceptions to this. First in the calls to Match, it is possible to
-- specify a non-zero size that is known to be large enough. This can
-- slightly increase the efficiency by avoiding a copy. Second, in the case
-- of calling compile, it is possible using the procedural form of Compile
-- to use a single Pattern_Matcher variable for several different
-- expressions by setting its size sufficiently large.
Auto_Size : constant := 0;
-- Used in calls to Match to indicate that the Size should be set to
-- a value appropriate to the expression being used automatically.
type Regexp_Flags is mod 256;
for Regexp_Flags'Size use 8;
-- Flags that can be given at compile time to specify default
-- properties for the regular expression.
No_Flags : constant Regexp_Flags;
Case_Insensitive : constant Regexp_Flags;
-- The automaton is optimized so that the matching is done in a case
-- insensitive manner (upper case characters and lower case characters
-- are all treated the same way).
Single_Line : constant Regexp_Flags;
-- Treat the Data we are matching as a single line. This means that
-- ^ and $ will ignore \n (unless Multiple_Lines is also specified),
-- and that '.' will match \n.
Multiple_Lines : constant Regexp_Flags;
-- Treat the Data as multiple lines. This means that ^ and $ will also
-- match on internal newlines (ASCII.LF), in addition to the beginning
-- and end of the string.
--
-- This can be combined with Single_Line.
-----------------
-- Match_Array --
-----------------
subtype Match_Count is Natural range 0 .. Max_Paren_Count;
type Match_Location is record
First : Natural := 0;
Last : Natural := 0;
end record;
type Match_Array is array (Match_Count range <>) of Match_Location;
-- Used for regular expressions that can contain parenthesized
-- subexpressions. Certain Match subprograms below produce Matches of type
-- Match_Array. Each component of Matches is set to the subrange of the
-- matches substring, or to No_Match if no match. Matches (N) is for the
-- N'th parenthesized subexpressions; Matches (0) is for the whole
-- expression.
--
-- Non-capturing parenthesis (introduced with (?:...)) cannot be
-- retrieved and do not count in the match array index.
--
-- For instance, if your regular expression is: "a((b*)c+)(d+)", then
-- 12 3
-- Matches (0) is for "a((b*)c+)(d+)" (the entire expression)
-- Matches (1) is for "(b*)c+"
-- Matches (2) is for "b*"
-- Matches (3) is for "d+"
--
-- The number of parenthesis groups that can be retrieved is limited only
-- by Max_Paren_Count.
--
-- Normally, the bounds of the Matches actual parameter will be
-- 0 .. Paren_Count (Regexp), to get all the matches. However, it is fine
-- if Matches is shorter than that on either end; missing components will
-- be ignored. Thus, in the above example, you could use 2 .. 2 if all you
-- care about it the second parenthesis pair "b*". Likewise, if
-- Matches'Last > Paren_Count (Regexp), the extra components will be set to
-- No_Match.
No_Match : constant Match_Location := (First => 0, Last => 0);
-- The No_Match constant is (0, 0) to differentiate between matching a null
-- string at position 1, which uses (1, 0) and no match at all.
---------------------------------
-- Pattern_Matcher Compilation --
---------------------------------
-- The subprograms here are used to precompile regular expressions for use
-- in subsequent Match calls. Precompilation improves efficiency if the
-- same regular expression is to be used in more than one Match call.
type Pattern_Matcher (Size : Program_Size) is private;
-- Type used to represent a regular expression compiled into byte code
Never_Match : constant Pattern_Matcher;
-- A regular expression that never matches anything
function Compile
(Expression : String;
Flags : Regexp_Flags := No_Flags) return Pattern_Matcher;
-- Compile a regular expression into internal code
--
-- Raises Expression_Error if Expression is not a legal regular expression
--
-- The appropriate size is calculated automatically to correspond to the
-- provided expression. This is the normal default method of compilation.
-- Note that it is generally not possible to assign the result of two
-- different calls to this Compile function to the same Pattern_Matcher
-- variable, since the sizes will differ.
--
-- Flags is the default value to use to set properties for Expression
-- (e.g. case sensitivity,...).
procedure Compile
(Matcher : out Pattern_Matcher;
Expression : String;
Final_Code_Size : out Program_Size;
Flags : Regexp_Flags := No_Flags);
-- Compile a regular expression into internal code
-- This procedure is significantly faster than the Compile function since
-- it avoids the extra step of precomputing the required size.
--
-- However, it requires the user to provide a Pattern_Matcher variable
-- whose size is preset to a large enough value. One advantage of this
-- approach, in addition to the improved efficiency, is that the same
-- Pattern_Matcher variable can be used to hold the compiled code for
-- several different regular expressions by setting a size that is large
-- enough to accommodate all possibilities.
--
-- In this version of the procedure call, the actual required code size is
-- returned. Also if Matcher.Size is zero on entry, then the resulting code
-- is not stored. A call with Matcher.Size set to Auto_Size can thus be
-- used to determine the space required for compiling the given regular
-- expression.
--
-- This function raises Storage_Error if Matcher is too small to hold
-- the resulting code (i.e. Matcher.Size has too small a value).
--
-- Expression_Error is raised if the string Expression does not contain
-- a valid regular expression.
--
-- Flags is the default value to use to set properties for Expression (case
-- sensitivity,...).
procedure Compile
(Matcher : out Pattern_Matcher;
Expression : String;
Flags : Regexp_Flags := No_Flags);
-- Same procedure as above, expect it does not return the final
-- program size, and Matcher.Size cannot be Auto_Size.
function Paren_Count (Regexp : Pattern_Matcher) return Match_Count;
pragma Inline (Paren_Count);
-- Return the number of parenthesis pairs in Regexp.
--
-- This is the maximum index that will be filled if a Match_Array is
-- used as an argument to Match.
--
-- Thus, if you want to be sure to get all the parenthesis, you should
-- do something like:
--
-- declare
-- Regexp : Pattern_Matcher := Compile ("a(b*)(c+)");
-- Matched : Match_Array (0 .. Paren_Count (Regexp));
-- begin
-- Match (Regexp, "a string", Matched);
-- end;
-------------
-- Quoting --
-------------
function Quote (Str : String) return String;
-- Return a version of Str so that every special character is quoted.
-- The resulting string can be used in a regular expression to match
-- exactly Str, whatever character was present in Str.
--------------
-- Matching --
--------------
-- The Match subprograms are given a regular expression in string
-- form, and perform the corresponding match. The following parameters
-- are present in all forms of the Match call.
-- Expression contains the regular expression to be matched as a string
-- Data contains the string to be matched
-- Data_First is the lower bound for the match, i.e. Data (Data_First)
-- will be the first character to be examined. If Data_First is set to
-- the special value of -1 (the default), then the first character to
-- be examined is Data (Data'First). However, the regular expression
-- character ^ (start of string) always refers to the first character
-- of the full string (Data (Data'First)), which is why there is a
-- separate mechanism for specifying Data_First.
-- Data_Last is the upper bound for the match, i.e. Data (Data_Last)
-- will be the last character to be examined. If Data_Last is set to
-- the special value of Positive'Last (the default), then the last
-- character to be examined is Data (Data'Last). However, the regular
-- expression character $ (end of string) always refers to the last
-- character of the full string (Data (Data'Last)).
-- Note: the use of Data_First and Data_Last is not equivalent to
-- simply passing a slice as Expression because of the handling of
-- regular expression characters ^ and $.
-- Size is the size allocated for the compiled byte code. Normally
-- this is defaulted to Auto_Size which means that the appropriate
-- size is allocated automatically. It is possible to specify an
-- explicit size, which must be sufficiently large. This slightly
-- increases the efficiency by avoiding the extra step of computing
-- the appropriate size.
-- The following exceptions can be raised in calls to Match
--
-- Storage_Error is raised if a non-zero value is given for Size
-- and it is too small to hold the compiled byte code.
--
-- Expression_Error is raised if the given expression is not a legal
-- regular expression.
procedure Match
(Expression : String;
Data : String;
Matches : out Match_Array;
Size : Program_Size := Auto_Size;
Data_First : Integer := -1;
Data_Last : Positive := Positive'Last);
-- This version returns the result of the match stored in Match_Array;
-- see comments under Match_Array above for details.
function Match
(Expression : String;
Data : String;
Size : Program_Size := Auto_Size;
Data_First : Integer := -1;
Data_Last : Positive := Positive'Last) return Natural;
-- This version returns the position where Data matches, or if there is
-- no match, then the value Data'First - 1.
function Match
(Expression : String;
Data : String;
Size : Program_Size := Auto_Size;
Data_First : Integer := -1;
Data_Last : Positive := Positive'Last) return Boolean;
-- This version returns True if the match succeeds, False otherwise
------------------------------------------------
-- Matching a Pre-Compiled Regular Expression --
------------------------------------------------
-- The following functions are significantly faster if you need to reuse
-- the same regular expression multiple times, since you only have to
-- compile it once. For these functions you must first compile the
-- expression with a call to Compile as previously described.
-- The parameters Data, Data_First and Data_Last are as described
-- in the previous section.
function Match
(Self : Pattern_Matcher;
Data : String;
Data_First : Integer := -1;
Data_Last : Positive := Positive'Last) return Natural;
-- Match Data using the given pattern matcher. Returns the position
-- where Data matches, or (Data'First - 1) if there is no match.
function Match
(Self : Pattern_Matcher;
Data : String;
Data_First : Integer := -1;
Data_Last : Positive := Positive'Last) return Boolean;
-- Return True if Data matches using the given pattern matcher
pragma Inline (Match);
-- All except the last one below
procedure Match
(Self : Pattern_Matcher;
Data : String;
Matches : out Match_Array;
Data_First : Integer := -1;
Data_Last : Positive := Positive'Last);
-- Match Data using the given pattern matcher and store result in Matches;
-- see comments under Match_Array above for details.
-----------
-- Debug --
-----------
procedure Dump (Self : Pattern_Matcher);
-- Dump the compiled version of the regular expression matched by Self
--------------------------
-- Private Declarations --
--------------------------
private
subtype Pointer is Program_Size;
-- The Pointer type is used to point into Program_Data
-- Note that the pointer type is not necessarily 2 bytes
-- although it is stored in the program using 2 bytes
type Program_Data is array (Pointer range <>) of Character;
Program_First : constant := 1;
-- The "internal use only" fields in regexp are present to pass info from
-- compile to execute that permits the execute phase to run lots faster on
-- simple cases. They are:
-- First character that must begin a match or ASCII.NUL
-- Anchored true iff match must start at beginning of line
-- Must_Have pointer to string that match must include or null
-- Must_Have_Length length of Must_Have string
-- First and Anchored permit very fast decisions on suitable starting
-- points for a match, cutting down the work a lot. Must_Have permits fast
-- rejection of lines that cannot possibly match.
-- The Must_Have tests are costly enough that Optimize supplies a Must_Have
-- only if the r.e. contains something potentially expensive (at present,
-- the only such thing detected is * or at the start of the r.e., which can
-- involve a lot of backup). The length is supplied because the test in
-- Execute needs it and Optimize is computing it anyway.
-- The initialization is meant to fail-safe in case the user of this
-- package tries to use an uninitialized matcher. This takes advantage
-- of the knowledge that ASCII.NUL translates to the end-of-program (EOP)
-- instruction code of the state machine.
No_Flags : constant Regexp_Flags := 0;
Case_Insensitive : constant Regexp_Flags := 1;
Single_Line : constant Regexp_Flags := 2;
Multiple_Lines : constant Regexp_Flags := 4;
type Pattern_Matcher (Size : Pointer) is record
First : Character := ASCII.NUL; -- internal use only
Anchored : Boolean := False; -- internal use only
Must_Have : Pointer := 0; -- internal use only
Must_Have_Length : Natural := 0; -- internal use only
Paren_Count : Natural := 0; -- # paren groups
Flags : Regexp_Flags := No_Flags;
Program : Program_Data (Program_First .. Size) :=
[others => ASCII.NUL];
end record;
Never_Match : constant Pattern_Matcher :=
(0, ASCII.NUL, False, 0, 0, 0, No_Flags, [others => ASCII.NUL]);
end System.Regpat;
|
Fabien-Chouteau/samd51-hal | Ada | 28,431 | ads | pragma Style_Checks (Off);
-- This spec has been automatically generated from ATSAMD51G19A.svd
pragma Restrictions (No_Elaboration_Code);
with HAL;
with System;
package SAM_SVD.SystemControl is
pragma Preelaborate;
---------------
-- Registers --
---------------
subtype SystemControl_ICTR_INTLINESNUM_Field is HAL.UInt4;
-- Interrupt Controller Type Register
type SystemControl_ICTR_Register is record
-- Read-only.
INTLINESNUM : SystemControl_ICTR_INTLINESNUM_Field;
-- unspecified
Reserved_4_31 : HAL.UInt28;
end record
with Volatile_Full_Access, Object_Size => 32,
Bit_Order => System.Low_Order_First;
for SystemControl_ICTR_Register use record
INTLINESNUM at 0 range 0 .. 3;
Reserved_4_31 at 0 range 4 .. 31;
end record;
-- Auxiliary Control Register
type SystemControl_ACTLR_Register is record
-- Disable interruption of LDM/STM instructions
DISMCYCINT : Boolean := False;
-- Disable wruite buffer use during default memory map accesses
DISDEFWBUF : Boolean := False;
-- Disable IT folding
DISFOLD : Boolean := False;
-- unspecified
Reserved_3_7 : HAL.UInt5 := 16#0#;
-- Disable automatic update of CONTROL.FPCA
DISFPCA : Boolean := False;
-- Disable out-of-order FP instructions
DISOOFP : Boolean := False;
-- unspecified
Reserved_10_31 : HAL.UInt22 := 16#0#;
end record
with Volatile_Full_Access, Object_Size => 32,
Bit_Order => System.Low_Order_First;
for SystemControl_ACTLR_Register use record
DISMCYCINT at 0 range 0 .. 0;
DISDEFWBUF at 0 range 1 .. 1;
DISFOLD at 0 range 2 .. 2;
Reserved_3_7 at 0 range 3 .. 7;
DISFPCA at 0 range 8 .. 8;
DISOOFP at 0 range 9 .. 9;
Reserved_10_31 at 0 range 10 .. 31;
end record;
subtype SystemControl_CPUID_REVISION_Field is HAL.UInt4;
subtype SystemControl_CPUID_PARTNO_Field is HAL.UInt12;
subtype SystemControl_CPUID_CONSTANT_Field is HAL.UInt4;
subtype SystemControl_CPUID_VARIANT_Field is HAL.UInt4;
subtype SystemControl_CPUID_IMPLEMENTER_Field is HAL.UInt8;
-- CPUID Base Register
type SystemControl_CPUID_Register is record
-- Read-only. Processor revision number
REVISION : SystemControl_CPUID_REVISION_Field;
-- Read-only. Process Part Number, 0xC24=Cortex-M4
PARTNO : SystemControl_CPUID_PARTNO_Field;
-- Read-only. Constant
CONSTANT_k : SystemControl_CPUID_CONSTANT_Field;
-- Read-only. Variant number
VARIANT : SystemControl_CPUID_VARIANT_Field;
-- Read-only. Implementer code, 0x41=ARM
IMPLEMENTER : SystemControl_CPUID_IMPLEMENTER_Field;
end record
with Volatile_Full_Access, Object_Size => 32,
Bit_Order => System.Low_Order_First;
for SystemControl_CPUID_Register use record
REVISION at 0 range 0 .. 3;
PARTNO at 0 range 4 .. 15;
CONSTANT_k at 0 range 16 .. 19;
VARIANT at 0 range 20 .. 23;
IMPLEMENTER at 0 range 24 .. 31;
end record;
subtype SystemControl_ICSR_VECTACTIVE_Field is HAL.UInt9;
subtype SystemControl_ICSR_VECTPENDING_Field is HAL.UInt6;
-- SysTick clear-pending bit
type ICSR_PENDSTCLRSelect is
(-- No effect
VALUE_0,
-- Removes the pending state from the SysTick exception
VALUE_1)
with Size => 1;
for ICSR_PENDSTCLRSelect use
(VALUE_0 => 0,
VALUE_1 => 1);
-- SysTick set-pending bit
type ICSR_PENDSTSETSelect is
(-- Write: no effect; read: SysTick exception is not pending
VALUE_0,
-- Write: changes SysTick exception state to pending; read: SysTick exception
-- is pending
VALUE_1)
with Size => 1;
for ICSR_PENDSTSETSelect use
(VALUE_0 => 0,
VALUE_1 => 1);
-- PendSV clear-pending bit
type ICSR_PENDSVCLRSelect is
(-- No effect
VALUE_0,
-- Removes the pending state from the PendSV exception
VALUE_1)
with Size => 1;
for ICSR_PENDSVCLRSelect use
(VALUE_0 => 0,
VALUE_1 => 1);
-- PendSV set-pending bit
type ICSR_PENDSVSETSelect is
(-- Write: no effect; read: PendSV exception is not pending
VALUE_0,
-- Write: changes PendSV exception state to pending; read: PendSV exception is
-- pending
VALUE_1)
with Size => 1;
for ICSR_PENDSVSETSelect use
(VALUE_0 => 0,
VALUE_1 => 1);
-- NMI set-pending bit
type ICSR_NMIPENDSETSelect is
(-- Write: no effect; read: NMI exception is not pending
VALUE_0,
-- Write: changes NMI exception state to pending; read: NMI exception is
-- pending
VALUE_1)
with Size => 1;
for ICSR_NMIPENDSETSelect use
(VALUE_0 => 0,
VALUE_1 => 1);
-- Interrupt Control and State Register
type SystemControl_ICSR_Register is record
-- Active exception number
VECTACTIVE : SystemControl_ICSR_VECTACTIVE_Field := 16#0#;
-- unspecified
Reserved_9_10 : HAL.UInt2 := 16#0#;
-- No preempted active exceptions to execute
RETTOBASE : Boolean := False;
-- Exception number of the highest priority pending enabled exception
VECTPENDING : SystemControl_ICSR_VECTPENDING_Field := 16#0#;
-- unspecified
Reserved_18_21 : HAL.UInt4 := 16#0#;
-- Interrupt pending flag
ISRPENDING : Boolean := False;
-- Debug only
ISRPREEMPT : Boolean := False;
-- unspecified
Reserved_24_24 : HAL.Bit := 16#0#;
-- SysTick clear-pending bit
PENDSTCLR : ICSR_PENDSTCLRSelect := SAM_SVD.SystemControl.VALUE_0;
-- SysTick set-pending bit
PENDSTSET : ICSR_PENDSTSETSelect := SAM_SVD.SystemControl.VALUE_0;
-- PendSV clear-pending bit
PENDSVCLR : ICSR_PENDSVCLRSelect := SAM_SVD.SystemControl.VALUE_0;
-- PendSV set-pending bit
PENDSVSET : ICSR_PENDSVSETSelect := SAM_SVD.SystemControl.VALUE_0;
-- unspecified
Reserved_29_30 : HAL.UInt2 := 16#0#;
-- NMI set-pending bit
NMIPENDSET : ICSR_NMIPENDSETSelect := SAM_SVD.SystemControl.VALUE_0;
end record
with Volatile_Full_Access, Object_Size => 32,
Bit_Order => System.Low_Order_First;
for SystemControl_ICSR_Register use record
VECTACTIVE at 0 range 0 .. 8;
Reserved_9_10 at 0 range 9 .. 10;
RETTOBASE at 0 range 11 .. 11;
VECTPENDING at 0 range 12 .. 17;
Reserved_18_21 at 0 range 18 .. 21;
ISRPENDING at 0 range 22 .. 22;
ISRPREEMPT at 0 range 23 .. 23;
Reserved_24_24 at 0 range 24 .. 24;
PENDSTCLR at 0 range 25 .. 25;
PENDSTSET at 0 range 26 .. 26;
PENDSVCLR at 0 range 27 .. 27;
PENDSVSET at 0 range 28 .. 28;
Reserved_29_30 at 0 range 29 .. 30;
NMIPENDSET at 0 range 31 .. 31;
end record;
subtype SystemControl_VTOR_TBLOFF_Field is HAL.UInt25;
-- Vector Table Offset Register
type SystemControl_VTOR_Register is record
-- unspecified
Reserved_0_6 : HAL.UInt7 := 16#0#;
-- Vector table base offset
TBLOFF : SystemControl_VTOR_TBLOFF_Field := 16#0#;
end record
with Volatile_Full_Access, Object_Size => 32,
Bit_Order => System.Low_Order_First;
for SystemControl_VTOR_Register use record
Reserved_0_6 at 0 range 0 .. 6;
TBLOFF at 0 range 7 .. 31;
end record;
-- System Reset Request
type AIRCR_SYSRESETREQSelect is
(-- No system reset request
VALUE_0,
-- Asserts a signal to the outer system that requests a reset
VALUE_1)
with Size => 1;
for AIRCR_SYSRESETREQSelect use
(VALUE_0 => 0,
VALUE_1 => 1);
subtype SystemControl_AIRCR_PRIGROUP_Field is HAL.UInt3;
-- Data endianness, 0=little, 1=big
type AIRCR_ENDIANNESSSelect is
(-- Little-endian
VALUE_0,
-- Big-endian
VALUE_1)
with Size => 1;
for AIRCR_ENDIANNESSSelect use
(VALUE_0 => 0,
VALUE_1 => 1);
subtype SystemControl_AIRCR_VECTKEY_Field is HAL.UInt16;
-- Application Interrupt and Reset Control Register
type SystemControl_AIRCR_Register is record
-- Must write 0
VECTRESET : Boolean := False;
-- Must write 0
VECTCLRACTIVE : Boolean := False;
-- System Reset Request
SYSRESETREQ : AIRCR_SYSRESETREQSelect :=
SAM_SVD.SystemControl.VALUE_0;
-- unspecified
Reserved_3_7 : HAL.UInt5 := 16#0#;
-- Interrupt priority grouping
PRIGROUP : SystemControl_AIRCR_PRIGROUP_Field := 16#0#;
-- unspecified
Reserved_11_14 : HAL.UInt4 := 16#0#;
-- Data endianness, 0=little, 1=big
ENDIANNESS : AIRCR_ENDIANNESSSelect :=
SAM_SVD.SystemControl.VALUE_0;
-- Register key
VECTKEY : SystemControl_AIRCR_VECTKEY_Field := 16#FA05#;
end record
with Volatile_Full_Access, Object_Size => 32,
Bit_Order => System.Low_Order_First;
for SystemControl_AIRCR_Register use record
VECTRESET at 0 range 0 .. 0;
VECTCLRACTIVE at 0 range 1 .. 1;
SYSRESETREQ at 0 range 2 .. 2;
Reserved_3_7 at 0 range 3 .. 7;
PRIGROUP at 0 range 8 .. 10;
Reserved_11_14 at 0 range 11 .. 14;
ENDIANNESS at 0 range 15 .. 15;
VECTKEY at 0 range 16 .. 31;
end record;
-- Sleep-on-exit on handler return
type SCR_SLEEPONEXITSelect is
(-- Do not sleep when returning to Thread mode
VALUE_0,
-- Enter sleep, or deep sleep, on return from an ISR
VALUE_1)
with Size => 1;
for SCR_SLEEPONEXITSelect use
(VALUE_0 => 0,
VALUE_1 => 1);
-- Deep Sleep used as low power mode
type SCR_SLEEPDEEPSelect is
(-- Sleep
VALUE_0,
-- Deep sleep
VALUE_1)
with Size => 1;
for SCR_SLEEPDEEPSelect use
(VALUE_0 => 0,
VALUE_1 => 1);
-- Send Event on Pending bit
type SCR_SEVONPENDSelect is
(-- Only enabled interrupts or events can wakeup the processor, disabled
-- interrupts are excluded
VALUE_0,
-- Enabled events and all interrupts, including disabled interrupts, can
-- wakeup the processor
VALUE_1)
with Size => 1;
for SCR_SEVONPENDSelect use
(VALUE_0 => 0,
VALUE_1 => 1);
-- System Control Register
type SystemControl_SCR_Register is record
-- unspecified
Reserved_0_0 : HAL.Bit := 16#0#;
-- Sleep-on-exit on handler return
SLEEPONEXIT : SCR_SLEEPONEXITSelect := SAM_SVD.SystemControl.VALUE_0;
-- Deep Sleep used as low power mode
SLEEPDEEP : SCR_SLEEPDEEPSelect := SAM_SVD.SystemControl.VALUE_0;
-- unspecified
Reserved_3_3 : HAL.Bit := 16#0#;
-- Send Event on Pending bit
SEVONPEND : SCR_SEVONPENDSelect := SAM_SVD.SystemControl.VALUE_0;
-- unspecified
Reserved_5_31 : HAL.UInt27 := 16#0#;
end record
with Volatile_Full_Access, Object_Size => 32,
Bit_Order => System.Low_Order_First;
for SystemControl_SCR_Register use record
Reserved_0_0 at 0 range 0 .. 0;
SLEEPONEXIT at 0 range 1 .. 1;
SLEEPDEEP at 0 range 2 .. 2;
Reserved_3_3 at 0 range 3 .. 3;
SEVONPEND at 0 range 4 .. 4;
Reserved_5_31 at 0 range 5 .. 31;
end record;
-- Enables unaligned access traps
type CCR_UNALIGN_TRPSelect is
(-- Do not trap unaligned halfword and word accesses
VALUE_0,
-- Trap unaligned halfword and word accesses
VALUE_1)
with Size => 1;
for CCR_UNALIGN_TRPSelect use
(VALUE_0 => 0,
VALUE_1 => 1);
-- Indicates stack alignment on exception entry
type CCR_STKALIGNSelect is
(-- 4-byte aligned
VALUE_0,
-- 8-byte aligned
VALUE_1)
with Size => 1;
for CCR_STKALIGNSelect use
(VALUE_0 => 0,
VALUE_1 => 1);
-- Configuration and Control Register
type SystemControl_CCR_Register is record
-- Indicates how processor enters Thread mode
NONBASETHRDENA : Boolean := False;
-- Enables unprivileged software access to STIR register
USERSETMPEND : Boolean := False;
-- unspecified
Reserved_2_2 : HAL.Bit := 16#0#;
-- Enables unaligned access traps
UNALIGN_TRP : CCR_UNALIGN_TRPSelect := SAM_SVD.SystemControl.VALUE_0;
-- Enables divide by 0 trap
DIV_0_TRP : Boolean := False;
-- unspecified
Reserved_5_7 : HAL.UInt3 := 16#0#;
-- Ignore LDM/STM BusFault for -1/-2 priority handlers
BFHFNMIGN : Boolean := False;
-- Indicates stack alignment on exception entry
STKALIGN : CCR_STKALIGNSelect := SAM_SVD.SystemControl.VALUE_1;
-- unspecified
Reserved_10_31 : HAL.UInt22 := 16#0#;
end record
with Volatile_Full_Access, Object_Size => 32,
Bit_Order => System.Low_Order_First;
for SystemControl_CCR_Register use record
NONBASETHRDENA at 0 range 0 .. 0;
USERSETMPEND at 0 range 1 .. 1;
Reserved_2_2 at 0 range 2 .. 2;
UNALIGN_TRP at 0 range 3 .. 3;
DIV_0_TRP at 0 range 4 .. 4;
Reserved_5_7 at 0 range 5 .. 7;
BFHFNMIGN at 0 range 8 .. 8;
STKALIGN at 0 range 9 .. 9;
Reserved_10_31 at 0 range 10 .. 31;
end record;
subtype SystemControl_SHPR1_PRI_4_Field is HAL.UInt8;
subtype SystemControl_SHPR1_PRI_5_Field is HAL.UInt8;
subtype SystemControl_SHPR1_PRI_6_Field is HAL.UInt8;
-- System Handler Priority Register 1
type SystemControl_SHPR1_Register is record
-- Priority of system handler 4, MemManage
PRI_4 : SystemControl_SHPR1_PRI_4_Field := 16#0#;
-- Priority of system handler 5, BusFault
PRI_5 : SystemControl_SHPR1_PRI_5_Field := 16#0#;
-- Priority of system handler 6, UsageFault
PRI_6 : SystemControl_SHPR1_PRI_6_Field := 16#0#;
-- unspecified
Reserved_24_31 : HAL.UInt8 := 16#0#;
end record
with Volatile_Full_Access, Object_Size => 32,
Bit_Order => System.Low_Order_First;
for SystemControl_SHPR1_Register use record
PRI_4 at 0 range 0 .. 7;
PRI_5 at 0 range 8 .. 15;
PRI_6 at 0 range 16 .. 23;
Reserved_24_31 at 0 range 24 .. 31;
end record;
subtype SystemControl_SHPR2_PRI_11_Field is HAL.UInt8;
-- System Handler Priority Register 2
type SystemControl_SHPR2_Register is record
-- unspecified
Reserved_0_23 : HAL.UInt24 := 16#0#;
-- Priority of system handler 11, SVCall
PRI_11 : SystemControl_SHPR2_PRI_11_Field := 16#0#;
end record
with Volatile_Full_Access, Object_Size => 32,
Bit_Order => System.Low_Order_First;
for SystemControl_SHPR2_Register use record
Reserved_0_23 at 0 range 0 .. 23;
PRI_11 at 0 range 24 .. 31;
end record;
subtype SystemControl_SHPR3_PRI_14_Field is HAL.UInt8;
subtype SystemControl_SHPR3_PRI_15_Field is HAL.UInt8;
-- System Handler Priority Register 3
type SystemControl_SHPR3_Register is record
-- unspecified
Reserved_0_15 : HAL.UInt16 := 16#0#;
-- Priority of system handler 14, PendSV
PRI_14 : SystemControl_SHPR3_PRI_14_Field := 16#0#;
-- Priority of system handler 15, SysTick exception
PRI_15 : SystemControl_SHPR3_PRI_15_Field := 16#0#;
end record
with Volatile_Full_Access, Object_Size => 32,
Bit_Order => System.Low_Order_First;
for SystemControl_SHPR3_Register use record
Reserved_0_15 at 0 range 0 .. 15;
PRI_14 at 0 range 16 .. 23;
PRI_15 at 0 range 24 .. 31;
end record;
-- System Handler Control and State Register
type SystemControl_SHCSR_Register is record
-- MemManage exception active bit
MEMFAULTACT : Boolean := False;
-- BusFault exception active bit
BUSFAULTACT : Boolean := False;
-- unspecified
Reserved_2_2 : HAL.Bit := 16#0#;
-- UsageFault exception active bit
USGFAULTACT : Boolean := False;
-- unspecified
Reserved_4_6 : HAL.UInt3 := 16#0#;
-- SVCall active bit
SVCALLACT : Boolean := False;
-- DebugMonitor exception active bit
MONITORACT : Boolean := False;
-- unspecified
Reserved_9_9 : HAL.Bit := 16#0#;
-- PendSV exception active bit
PENDSVACT : Boolean := False;
-- SysTick exception active bit
SYSTICKACT : Boolean := False;
-- UsageFault exception pending bit
USGFAULTPENDED : Boolean := False;
-- MemManage exception pending bit
MEMFAULTPENDED : Boolean := False;
-- BusFault exception pending bit
BUSFAULTPENDED : Boolean := False;
-- SVCall pending bit
SVCALLPENDED : Boolean := False;
-- MemManage enable bit
MEMFAULTENA : Boolean := False;
-- BusFault enable bit
BUSFAULTENA : Boolean := False;
-- UsageFault enable bit
USGFAULTENA : Boolean := False;
-- unspecified
Reserved_19_31 : HAL.UInt13 := 16#0#;
end record
with Volatile_Full_Access, Object_Size => 32,
Bit_Order => System.Low_Order_First;
for SystemControl_SHCSR_Register use record
MEMFAULTACT at 0 range 0 .. 0;
BUSFAULTACT at 0 range 1 .. 1;
Reserved_2_2 at 0 range 2 .. 2;
USGFAULTACT at 0 range 3 .. 3;
Reserved_4_6 at 0 range 4 .. 6;
SVCALLACT at 0 range 7 .. 7;
MONITORACT at 0 range 8 .. 8;
Reserved_9_9 at 0 range 9 .. 9;
PENDSVACT at 0 range 10 .. 10;
SYSTICKACT at 0 range 11 .. 11;
USGFAULTPENDED at 0 range 12 .. 12;
MEMFAULTPENDED at 0 range 13 .. 13;
BUSFAULTPENDED at 0 range 14 .. 14;
SVCALLPENDED at 0 range 15 .. 15;
MEMFAULTENA at 0 range 16 .. 16;
BUSFAULTENA at 0 range 17 .. 17;
USGFAULTENA at 0 range 18 .. 18;
Reserved_19_31 at 0 range 19 .. 31;
end record;
-- Configurable Fault Status Register
type SystemControl_CFSR_Register is record
-- Instruction access violation
IACCVIOL : Boolean := False;
-- Data access violation
DACCVIOL : Boolean := False;
-- unspecified
Reserved_2_2 : HAL.Bit := 16#0#;
-- MemManage Fault on unstacking for exception return
MUNSTKERR : Boolean := False;
-- MemManage Fault on stacking for exception entry
MSTKERR : Boolean := False;
-- MemManager Fault occured during FP lazy state preservation
MLSPERR : Boolean := False;
-- unspecified
Reserved_6_6 : HAL.Bit := 16#0#;
-- MemManage Fault Address Register valid
MMARVALID : Boolean := False;
-- Instruction bus error
IBUSERR : Boolean := False;
-- Precise data bus error
PRECISERR : Boolean := False;
-- Imprecise data bus error
IMPRECISERR : Boolean := False;
-- BusFault on unstacking for exception return
UNSTKERR : Boolean := False;
-- BusFault on stacking for exception entry
STKERR : Boolean := False;
-- BusFault occured during FP lazy state preservation
LSPERR : Boolean := False;
-- unspecified
Reserved_14_14 : HAL.Bit := 16#0#;
-- BusFault Address Register valid
BFARVALID : Boolean := False;
-- Undefined instruction UsageFault
UNDEFINSTR : Boolean := False;
-- Invalid state UsageFault
INVSTATE : Boolean := False;
-- Invalid PC load UsageFault
INVPC : Boolean := False;
-- No coprocessor UsageFault
NOCP : Boolean := False;
-- unspecified
Reserved_20_23 : HAL.UInt4 := 16#0#;
-- Unaligned access UsageFault
UNALIGNED : Boolean := False;
-- Divide by zero UsageFault
DIVBYZERO : Boolean := False;
-- unspecified
Reserved_26_31 : HAL.UInt6 := 16#0#;
end record
with Volatile_Full_Access, Object_Size => 32,
Bit_Order => System.Low_Order_First;
for SystemControl_CFSR_Register use record
IACCVIOL at 0 range 0 .. 0;
DACCVIOL at 0 range 1 .. 1;
Reserved_2_2 at 0 range 2 .. 2;
MUNSTKERR at 0 range 3 .. 3;
MSTKERR at 0 range 4 .. 4;
MLSPERR at 0 range 5 .. 5;
Reserved_6_6 at 0 range 6 .. 6;
MMARVALID at 0 range 7 .. 7;
IBUSERR at 0 range 8 .. 8;
PRECISERR at 0 range 9 .. 9;
IMPRECISERR at 0 range 10 .. 10;
UNSTKERR at 0 range 11 .. 11;
STKERR at 0 range 12 .. 12;
LSPERR at 0 range 13 .. 13;
Reserved_14_14 at 0 range 14 .. 14;
BFARVALID at 0 range 15 .. 15;
UNDEFINSTR at 0 range 16 .. 16;
INVSTATE at 0 range 17 .. 17;
INVPC at 0 range 18 .. 18;
NOCP at 0 range 19 .. 19;
Reserved_20_23 at 0 range 20 .. 23;
UNALIGNED at 0 range 24 .. 24;
DIVBYZERO at 0 range 25 .. 25;
Reserved_26_31 at 0 range 26 .. 31;
end record;
-- HardFault Status Register
type SystemControl_HFSR_Register is record
-- unspecified
Reserved_0_0 : HAL.Bit := 16#0#;
-- BusFault on a Vector Table read during exception processing
VECTTBL : Boolean := False;
-- unspecified
Reserved_2_29 : HAL.UInt28 := 16#0#;
-- Forced Hard Fault
FORCED : Boolean := False;
-- Debug: always write 0
DEBUGEVT : Boolean := False;
end record
with Volatile_Full_Access, Object_Size => 32,
Bit_Order => System.Low_Order_First;
for SystemControl_HFSR_Register use record
Reserved_0_0 at 0 range 0 .. 0;
VECTTBL at 0 range 1 .. 1;
Reserved_2_29 at 0 range 2 .. 29;
FORCED at 0 range 30 .. 30;
DEBUGEVT at 0 range 31 .. 31;
end record;
-- Debug Fault Status Register
type SystemControl_DFSR_Register is record
HALTED : Boolean := False;
BKPT : Boolean := False;
DWTTRAP : Boolean := False;
VCATCH : Boolean := False;
EXTERNAL : Boolean := False;
-- unspecified
Reserved_5_31 : HAL.UInt27 := 16#0#;
end record
with Volatile_Full_Access, Object_Size => 32,
Bit_Order => System.Low_Order_First;
for SystemControl_DFSR_Register use record
HALTED at 0 range 0 .. 0;
BKPT at 0 range 1 .. 1;
DWTTRAP at 0 range 2 .. 2;
VCATCH at 0 range 3 .. 3;
EXTERNAL at 0 range 4 .. 4;
Reserved_5_31 at 0 range 5 .. 31;
end record;
-- Processor Feature Register
-- Processor Feature Register
type SystemControl_PFR_Registers is array (0 .. 1) of HAL.UInt32;
-- Memory Model Feature Register
-- Memory Model Feature Register
type SystemControl_MMFR_Registers is array (0 .. 3) of HAL.UInt32;
-- Instruction Set Attributes Register
-- Instruction Set Attributes Register
type SystemControl_ISAR_Registers is array (0 .. 4) of HAL.UInt32;
-- Access privileges for coprocessor 10
type CPACR_CP10Select is
(-- Access denied
DENIED,
-- Privileged access only
PRIV,
-- Full access
FULL)
with Size => 2;
for CPACR_CP10Select use
(DENIED => 0,
PRIV => 1,
FULL => 3);
-- Access privileges for coprocessor 11
type CPACR_CP11Select is
(-- Access denied
DENIED,
-- Privileged access only
PRIV,
-- Full access
FULL)
with Size => 2;
for CPACR_CP11Select use
(DENIED => 0,
PRIV => 1,
FULL => 3);
-- Coprocessor Access Control Register
type SystemControl_CPACR_Register is record
-- unspecified
Reserved_0_19 : HAL.UInt20 := 16#0#;
-- Access privileges for coprocessor 10
CP10 : CPACR_CP10Select := SAM_SVD.SystemControl.DENIED;
-- Access privileges for coprocessor 11
CP11 : CPACR_CP11Select := SAM_SVD.SystemControl.DENIED;
-- unspecified
Reserved_24_31 : HAL.UInt8 := 16#0#;
end record
with Volatile_Full_Access, Object_Size => 32,
Bit_Order => System.Low_Order_First;
for SystemControl_CPACR_Register use record
Reserved_0_19 at 0 range 0 .. 19;
CP10 at 0 range 20 .. 21;
CP11 at 0 range 22 .. 23;
Reserved_24_31 at 0 range 24 .. 31;
end record;
-----------------
-- Peripherals --
-----------------
-- System Control Registers
type SystemControl_Peripheral is record
-- Interrupt Controller Type Register
ICTR : aliased SystemControl_ICTR_Register;
-- Auxiliary Control Register
ACTLR : aliased SystemControl_ACTLR_Register;
-- CPUID Base Register
CPUID : aliased SystemControl_CPUID_Register;
-- Interrupt Control and State Register
ICSR : aliased SystemControl_ICSR_Register;
-- Vector Table Offset Register
VTOR : aliased SystemControl_VTOR_Register;
-- Application Interrupt and Reset Control Register
AIRCR : aliased SystemControl_AIRCR_Register;
-- System Control Register
SCR : aliased SystemControl_SCR_Register;
-- Configuration and Control Register
CCR : aliased SystemControl_CCR_Register;
-- System Handler Priority Register 1
SHPR1 : aliased SystemControl_SHPR1_Register;
-- System Handler Priority Register 2
SHPR2 : aliased SystemControl_SHPR2_Register;
-- System Handler Priority Register 3
SHPR3 : aliased SystemControl_SHPR3_Register;
-- System Handler Control and State Register
SHCSR : aliased SystemControl_SHCSR_Register;
-- Configurable Fault Status Register
CFSR : aliased SystemControl_CFSR_Register;
-- HardFault Status Register
HFSR : aliased SystemControl_HFSR_Register;
-- Debug Fault Status Register
DFSR : aliased SystemControl_DFSR_Register;
-- MemManage Fault Address Register
MMFAR : aliased HAL.UInt32;
-- BusFault Address Register
BFAR : aliased HAL.UInt32;
-- Auxiliary Fault Status Register
AFSR : aliased HAL.UInt32;
-- Processor Feature Register
PFR : aliased SystemControl_PFR_Registers;
-- Debug Feature Register
DFR : aliased HAL.UInt32;
-- Auxiliary Feature Register
ADR : aliased HAL.UInt32;
-- Memory Model Feature Register
MMFR : aliased SystemControl_MMFR_Registers;
-- Instruction Set Attributes Register
ISAR : aliased SystemControl_ISAR_Registers;
-- Coprocessor Access Control Register
CPACR : aliased SystemControl_CPACR_Register;
end record
with Volatile;
for SystemControl_Peripheral use record
ICTR at 16#4# range 0 .. 31;
ACTLR at 16#8# range 0 .. 31;
CPUID at 16#D00# range 0 .. 31;
ICSR at 16#D04# range 0 .. 31;
VTOR at 16#D08# range 0 .. 31;
AIRCR at 16#D0C# range 0 .. 31;
SCR at 16#D10# range 0 .. 31;
CCR at 16#D14# range 0 .. 31;
SHPR1 at 16#D18# range 0 .. 31;
SHPR2 at 16#D1C# range 0 .. 31;
SHPR3 at 16#D20# range 0 .. 31;
SHCSR at 16#D24# range 0 .. 31;
CFSR at 16#D28# range 0 .. 31;
HFSR at 16#D2C# range 0 .. 31;
DFSR at 16#D30# range 0 .. 31;
MMFAR at 16#D34# range 0 .. 31;
BFAR at 16#D38# range 0 .. 31;
AFSR at 16#D3C# range 0 .. 31;
PFR at 16#D40# range 0 .. 63;
DFR at 16#D48# range 0 .. 31;
ADR at 16#D4C# range 0 .. 31;
MMFR at 16#D50# range 0 .. 127;
ISAR at 16#D60# range 0 .. 159;
CPACR at 16#D88# range 0 .. 31;
end record;
-- System Control Registers
SystemControl_Periph : aliased SystemControl_Peripheral
with Import, Address => SystemControl_Base;
end SAM_SVD.SystemControl;
|
XMoose25X/Advanced-Dungeon-Assault | Ada | 334 | ads | with player; use player;
package save_load_game is
procedure newGame(player: out Player_Type; dungeon: out Integer);
procedure saveGame(player: in Player_Type; dungeon: in Integer; fileNum: in Integer);
procedure loadGame(player: in out Player_Type; dungeon: in out Integer; fileNum: in Integer);
end save_load_game;
|
stcarrez/dynamo | Ada | 7,700 | adb | ------------------------------------------------------------------------------
-- --
-- ASIS-for-GNAT IMPLEMENTATION COMPONENTS --
-- --
-- A S I S . I M P L E M E N T A T I O N . P E R M I S S I O N S --
-- --
-- B o d y --
-- --
-- Copyright (C) 1995-2007, 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). --
-- --
------------------------------------------------------------------------------
package body Asis.Implementation.Permissions is
------------------------------
-- Attributes_Are_Supported --
------------------------------
function Attributes_Are_Supported return Boolean is
begin
return False;
end Attributes_Are_Supported;
------------------------------------------
-- Call_Statement_Parameters_Normalized --
------------------------------------------
function Call_Statement_Parameters_Normalized return Boolean is
begin
return False;
end Call_Statement_Parameters_Normalized;
-------------------------------
-- Default_In_Mode_Supported --
-------------------------------
function Default_In_Mode_Supported return Boolean is
begin
return True;
end Default_In_Mode_Supported;
------------------------------------------
-- Discriminant_Associations_Normalized --
------------------------------------------
function Discriminant_Associations_Normalized return Boolean is
begin
return False;
end Discriminant_Associations_Normalized;
-----------------------------------------
-- Function_Call_Parameters_Normalized --
-----------------------------------------
function Function_Call_Parameters_Normalized return Boolean is
begin
return False;
end Function_Call_Parameters_Normalized;
------------------------------------
-- Generic_Actual_Part_Normalized --
------------------------------------
function Generic_Actual_Part_Normalized return Boolean is
begin
return False;
end Generic_Actual_Part_Normalized;
---------------------------------------
-- Generic_Macro_Expansion_Supported --
---------------------------------------
function Generic_Macro_Expansion_Supported return Boolean is
begin
return True;
end Generic_Macro_Expansion_Supported;
-----------------------------------
-- Implicit_Components_Supported --
-----------------------------------
function Implicit_Components_Supported return Boolean is
begin
return False;
end Implicit_Components_Supported;
--------------------------------------
-- Inherited_Declarations_Supported --
--------------------------------------
function Inherited_Declarations_Supported return Boolean is
begin
return True;
end Inherited_Declarations_Supported;
-------------------------------------
-- Inherited_Subprograms_Supported --
-------------------------------------
function Inherited_Subprograms_Supported return Boolean is
begin
return True;
end Inherited_Subprograms_Supported;
-----------------------------
-- Is_Commentary_Supported --
-----------------------------
function Is_Commentary_Supported return Boolean is
begin
return True;
end Is_Commentary_Supported;
--------------------------------------------------
-- Is_Formal_Parameter_Named_Notation_Supported --
--------------------------------------------------
function Is_Formal_Parameter_Named_Notation_Supported return Boolean is
begin
return True;
end Is_Formal_Parameter_Named_Notation_Supported;
------------------------------
-- Is_Line_Number_Supported --
------------------------------
function Is_Line_Number_Supported return Boolean is
begin
return True;
end Is_Line_Number_Supported;
------------------------------
-- Is_Prefix_Call_Supported --
------------------------------
function Is_Prefix_Call_Supported return Boolean is
begin
return True;
end Is_Prefix_Call_Supported;
---------------------------------------
-- Is_Span_Column_Position_Supported --
---------------------------------------
function Is_Span_Column_Position_Supported return Boolean is
begin
return True;
end Is_Span_Column_Position_Supported;
------------------------------------
-- Object_Declarations_Normalized --
------------------------------------
function Object_Declarations_Normalized return Boolean is
begin
return False;
end Object_Declarations_Normalized;
-------------------------------------
-- Predefined_Operations_Supported --
-------------------------------------
function Predefined_Operations_Supported return Boolean is
begin
return False;
end Predefined_Operations_Supported;
----------------------------------------------
-- Record_Component_Associations_Normalized --
----------------------------------------------
function Record_Component_Associations_Normalized return Boolean is
begin
return False;
end Record_Component_Associations_Normalized;
end Asis.Implementation.Permissions;
|
charlie5/lace | Ada | 9,365 | adb | with
openGL.Geometry.lit_colored_textured,
openGL.Primitive.indexed;
package body openGL.Model.box.lit_colored_textured
is
type Geometry_view is access all Geometry.lit_colored_textured.item'Class;
---------
--- Forge
--
function new_Box (Size : in Vector_3;
Faces : in lit_colored_textured.Faces) return View
is
Self : constant View := new Item;
begin
Self.Faces := Faces;
Self.Size := Size;
return Self;
end new_Box;
--------------
--- Attributes
--
overriding
function to_GL_Geometries (Self : access Item; Textures : access Texture.name_Map_of_texture'Class;
Fonts : in Font.font_id_Map_of_font) return Geometry.views
is
pragma unreferenced (Fonts);
use Geometry.lit_colored_textured,
Texture;
the_Sites : constant box.Sites := Self.vertex_Sites;
the_Indices : aliased constant Indices := [1, 2, 3, 4];
function new_Face (Vertices : access geometry.lit_colored_textured.Vertex_array) return Geometry_view
is
use openGL.Primitive;
the_Geometry : constant Geometry_view := Geometry.lit_colored_textured.new_Geometry
(texture_is_Alpha => False);
the_Primitive : constant Primitive.view := Primitive.indexed.new_Primitive
(triangle_Fan,
the_Indices).all'Access;
begin
the_Geometry.Vertices_are (Vertices.all);
the_Geometry.add (the_Primitive);
return the_Geometry;
end new_Face;
front_Face : Geometry_view;
rear_Face : Geometry_view;
upper_Face : Geometry_view;
lower_Face : Geometry_view;
left_Face : Geometry_view;
right_Face : Geometry_view;
begin
-- Front
--
declare
the_Vertices : aliased Geometry.lit_colored_textured.Vertex_array
:= [1 => (Site => the_Sites ( Left_Lower_Front), Normal => front_Normal, Color => +Self.Faces (Front).Colors (1), Coords => (0.0, 0.0), Shine => default_Shine),
2 => (Site => the_Sites (Right_Lower_Front), Normal => front_Normal, Color => +Self.Faces (Front).Colors (2), Coords => (1.0, 0.0), Shine => default_Shine),
3 => (Site => the_Sites (right_upper_front), Normal => front_Normal, Color => +Self.Faces (Front).Colors (3), Coords => (1.0, 1.0), Shine => default_Shine),
4 => (Site => the_Sites ( Left_Upper_Front), Normal => front_Normal, Color => +Self.Faces (Front).Colors (4), Coords => (0.0, 1.0), Shine => default_Shine)];
begin
front_Face := new_Face (Vertices => the_Vertices'Access);
if Self.Faces (Front).texture_Name /= null_Asset
then
front_Face.Texture_is (Textures.fetch (Self.Faces (Front).texture_Name));
front_Face.is_Transparent (now => front_Face.Texture.is_Transparent);
end if;
end;
-- Rear
--
declare
the_Vertices : aliased Geometry.lit_colored_textured.Vertex_array
:= [1 => (Site => the_Sites (Right_Lower_Rear), Normal => rear_Normal, Color => +Self.Faces (Rear).Colors (1), Coords => (0.0, 0.0), Shine => default_Shine),
2 => (Site => the_Sites ( Left_Lower_Rear), Normal => rear_Normal, Color => +Self.Faces (Rear).Colors (2), Coords => (1.0, 0.0), Shine => default_Shine),
3 => (Site => the_Sites ( Left_Upper_Rear), Normal => rear_Normal, Color => +Self.Faces (Rear).Colors (3), Coords => (1.0, 1.0), Shine => default_Shine),
4 => (Site => the_Sites (Right_Upper_Rear), Normal => rear_Normal, Color => +Self.Faces (Rear).Colors (4), Coords => (0.0, 1.0), Shine => default_Shine)];
begin
rear_Face := new_Face (Vertices => the_Vertices'Access);
if Self.Faces (Rear).texture_Name /= null_Asset
then
rear_Face.Texture_is (Textures.fetch (Self.Faces (Rear).texture_Name));
rear_Face.is_Transparent (now => rear_Face.Texture.is_Transparent);
end if;
end;
-- Upper
--
declare
the_Vertices : aliased Geometry.lit_colored_textured.Vertex_array
:= [1 => (Site => the_Sites ( Left_Upper_Front), Normal => upper_Normal, Color => +Self.Faces (Upper).Colors (1), Coords => (0.0, 0.0), Shine => default_Shine),
2 => (Site => the_Sites (Right_Upper_Front), Normal => upper_Normal, Color => +Self.Faces (Upper).Colors (2), Coords => (1.0, 0.0), Shine => default_Shine),
3 => (Site => the_Sites (Right_Upper_Rear), Normal => upper_Normal, Color => +Self.Faces (Upper).Colors (3), Coords => (1.0, 1.0), Shine => default_Shine),
4 => (Site => the_Sites ( Left_Upper_Rear), Normal => upper_Normal, Color => +Self.Faces (Upper).Colors (4), Coords => (0.0, 1.0), Shine => default_Shine)];
begin
upper_Face := new_Face (Vertices => the_Vertices'Access);
if Self.Faces (Upper).texture_Name /= null_Asset
then
upper_Face.Texture_is (Textures.fetch (Self.Faces (Upper).texture_Name));
upper_Face.is_Transparent (now => upper_Face.Texture.is_Transparent);
end if;
end;
-- Lower
--
declare
the_Vertices : aliased Geometry.lit_colored_textured.Vertex_array
:= [1 => (Site => the_Sites (Right_Lower_Front), Normal => lower_Normal, Color => +Self.Faces (Lower).Colors (1), Coords => (0.0, 0.0), Shine => default_Shine),
2 => (Site => the_Sites ( Left_Lower_Front), Normal => lower_Normal, Color => +Self.Faces (Lower).Colors (2), Coords => (1.0, 0.0), Shine => default_Shine),
3 => (Site => the_Sites ( Left_Lower_Rear), Normal => lower_Normal, Color => +Self.Faces (Lower).Colors (3), Coords => (1.0, 1.0), Shine => default_Shine),
4 => (Site => the_Sites (Right_Lower_Rear), Normal => lower_Normal, Color => +Self.Faces (Lower).Colors (4), Coords => (0.0, 1.0), Shine => default_Shine)];
begin
lower_Face := new_Face (Vertices => the_Vertices'Access);
if Self.Faces (Lower).texture_Name /= null_Asset
then
lower_Face.Texture_is (Textures.fetch (Self.Faces (Lower).texture_Name));
lower_Face.is_Transparent (now => lower_Face.Texture.is_Transparent);
end if;
end;
-- Left
--
declare
the_Vertices : aliased Geometry.lit_colored_textured.Vertex_array
:= [1 => (Site => the_Sites (Left_Lower_Rear), Normal => left_Normal, Color => +Self.Faces (Left).Colors (1), Coords => (0.0, 0.0), Shine => default_Shine),
2 => (Site => the_Sites (Left_Lower_Front), Normal => left_Normal, Color => +Self.Faces (Left).Colors (2), Coords => (1.0, 0.0), Shine => default_Shine),
3 => (Site => the_Sites (Left_Upper_Front), Normal => left_Normal, Color => +Self.Faces (Left).Colors (3), Coords => (1.0, 1.0), Shine => default_Shine),
4 => (Site => the_Sites (Left_Upper_Rear), Normal => left_Normal, Color => +Self.Faces (Left).Colors (4), Coords => (0.0, 1.0), Shine => default_Shine)];
begin
left_Face := new_Face (Vertices => the_Vertices'Access);
if Self.Faces (Left).texture_Name /= null_Asset
then
left_Face.Texture_is (Textures.fetch (Self.Faces (Left).texture_Name));
left_Face.is_Transparent (now => left_Face.Texture.is_Transparent);
end if;
end;
-- Right
--
declare
the_Vertices : aliased Geometry.lit_colored_textured.Vertex_array
:= [1 => (Site => the_Sites (Right_Lower_Front), Normal => right_Normal, Color => +Self.Faces (Right).Colors (1), Coords => (0.0, 0.0), Shine => default_Shine),
2 => (Site => the_Sites (Right_Lower_Rear), Normal => right_Normal, Color => +Self.Faces (Right).Colors (2), Coords => (1.0, 0.0), Shine => default_Shine),
3 => (Site => the_Sites (Right_Upper_Rear), Normal => right_Normal, Color => +Self.Faces (Right).Colors (3), Coords => (1.0, 1.0), Shine => default_Shine),
4 => (Site => the_Sites (Right_Upper_Front), Normal => right_Normal, Color => +Self.Faces (Right).Colors (4), Coords => (0.0, 1.0), Shine => default_Shine)];
begin
right_Face := new_Face (Vertices => the_Vertices'Access);
if Self.Faces (Right).texture_Name /= null_Asset
then
right_Face.Texture_is (Textures.fetch (Self.Faces (Right).texture_Name));
right_Face.is_Transparent (now => right_Face.Texture.is_Transparent);
end if;
end;
return [1 => front_Face.all'Access,
2 => rear_Face.all'Access,
3 => upper_Face.all'Access,
4 => lower_Face.all'Access,
5 => left_Face.all'Access,
6 => right_Face.all'Access];
end to_GL_Geometries;
end openGL.Model.box.lit_colored_textured;
|
AdaCore/Ada_Drivers_Library | Ada | 4,007 | ads | ------------------------------------------------------------------------------
-- --
-- Copyright (C) 2016, AdaCore --
-- --
-- Redistribution and use in source and binary forms, with or without --
-- modification, are permitted provided that the following conditions are --
-- met: --
-- 1. Redistributions of source code must retain the above copyright --
-- notice, this list of conditions and the following disclaimer. --
-- 2. Redistributions in binary form must reproduce the above copyright --
-- notice, this list of conditions and the following disclaimer in --
-- the documentation and/or other materials provided with the --
-- distribution. --
-- 3. Neither the name of the copyright holder nor the names of its --
-- contributors may be used to endorse or promote products derived --
-- from this software without specific prior written permission. --
-- --
-- THIS SOFTWARE IS PROVIDED BY THE COPYRIGHT HOLDERS AND CONTRIBUTORS --
-- "AS IS" AND ANY EXPRESS OR IMPLIED WARRANTIES, INCLUDING, BUT NOT --
-- LIMITED TO, THE IMPLIED WARRANTIES OF MERCHANTABILITY AND FITNESS FOR --
-- A PARTICULAR PURPOSE ARE DISCLAIMED. IN NO EVENT SHALL THE COPYRIGHT --
-- HOLDER OR CONTRIBUTORS BE LIABLE FOR ANY DIRECT, INDIRECT, INCIDENTAL, --
-- SPECIAL, EXEMPLARY, OR CONSEQUENTIAL DAMAGES (INCLUDING, BUT NOT --
-- LIMITED TO, PROCUREMENT OF SUBSTITUTE GOODS OR SERVICES; LOSS OF USE, --
-- DATA, OR PROFITS; OR BUSINESS INTERRUPTION) HOWEVER CAUSED AND ON ANY --
-- THEORY OF LIABILITY, WHETHER IN CONTRACT, STRICT LIABILITY, OR TORT --
-- (INCLUDING NEGLIGENCE OR OTHERWISE) ARISING IN ANY WAY OUT OF THE USE --
-- OF THIS SOFTWARE, EVEN IF ADVISED OF THE POSSIBILITY OF SUCH DAMAGE. --
-- --
------------------------------------------------------------------------------
with L3GD20; use L3GD20;
with BMP_Fonts; use BMP_Fonts;
package Output_Utils is
procedure Print_Static_Content (Stable : Angle_Rates);
procedure Print (X, Y : Natural; Msg : String);
-- these constants are used for displaying values on the LCD
Selected_Font : constant BMP_Font := Font12x12;
Line_Height : constant Positive := Char_Height (Selected_Font) + 4;
-- the locations on the screen for the stable offsets
Line1_Stable : constant Natural := 0;
Line2_Stable : constant Natural := Line1_Stable + Line_Height;
Line3_Stable : constant Natural := Line2_Stable + Line_Height;
-- the locations on the screen for adjusted values
Line1_Adjusted : constant Natural := 55; -- leaves room for printing stable values
Line2_Adjusted : constant Natural := Line1_Adjusted + Line_Height;
Line3_Adjusted : constant Natural := Line2_Adjusted + Line_Height;
-- the column number for displaying adjusted values dynamically, based on
-- the length of the longest static label
Col_Adjusted : constant Natural := String'("Adjusted X:")'Length * Char_Width (Selected_Font);
-- the locations on the screen for the final scaled values
Line1_Final : constant Natural := 110; -- leaves room for printing adjusted values
Line2_Final : constant Natural := Line1_Final + Line_Height;
Line3_Final : constant Natural := Line2_Final + Line_Height;
-- the column number for displaying the final values dynamically, based on
-- the length of the longest static label
Final_Column : constant Natural := String'("X:")'Length * Char_Width (Selected_Font);
end Output_Utils;
|
zhmu/ananas | Ada | 598 | adb | with Ada.Unchecked_Conversion;
with System.Address_Image;
package body Subp_Inst_Pkg is
function Image (Val : T_Access) return String is
function Convert is new Ada.Unchecked_Conversion
(T_Access, System.Address);
begin
return System.Address_Image (Convert (Val));
end Image;
function T_Image (Val : access T) return String is
type T_Access is access all T;
function Convert is new Ada.Unchecked_Conversion
(T_Access, System.Address);
begin
return System.Address_Image (Convert (T_Access (Val)));
end T_Image;
end Subp_Inst_Pkg;
|
Componolit/libsparkcrypto | Ada | 3,663 | ads | -------------------------------------------------------------------------------
-- This file is part of libsparkcrypto.
--
-- @author Alexander Senier
-- @date 2019-01-21
--
-- Copyright (C) 2018 Componolit GmbH
-- 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 nor the names of its contributors may be used
-- to endorse or promote products derived from this software without
-- specific prior written permission.
--
-- THIS SOFTWARE IS PROVIDED BY THE COPYRIGHT HOLDERS AND CONTRIBUTORS "AS IS"
-- AND ANY EXPRESS OR IMPLIED WARRANTIES, INCLUDING, BUT NOT LIMITED TO, THE
-- IMPLIED WARRANTIES OF MERCHANTABILITY AND FITNESS FOR A PARTICULAR PURPOSE
-- ARE DISCLAIMED. IN NO EVENT SHALL THE COPYRIGHT HOLDER OR CONTRIBUTORS
-- BE LIABLE FOR ANY DIRECT, INDIRECT, INCIDENTAL, SPECIAL, EXEMPLARY, OR
-- CONSEQUENTIAL DAMAGES (INCLUDING, BUT NOT LIMITED TO, PROCUREMENT OF
-- SUBSTITUTE GOODS OR SERVICES; LOSS OF USE, DATA, OR PROFITS; OR BUSINESS
-- INTERRUPTION) HOWEVER CAUSED AND ON ANY THEORY OF LIABILITY, WHETHER IN
-- CONTRACT, STRICT LIABILITY, OR TORT (INCLUDING NEGLIGENCE OR OTHERWISE)
-- ARISING IN ANY WAY OUT OF THE USE OF THIS SOFTWARE, EVEN IF ADVISED OF THE
-- POSSIBILITY OF SUCH DAMAGE.
-------------------------------------------------------------------------------
package LSC.SHA2.HMAC_Generic
is
pragma Pure;
generic
type Key_Index_Type is (<>);
type Key_Elem_Type is (<>);
type Key_Type is array (Key_Index_Type range <>) of Key_Elem_Type;
type Message_Index_Type is (<>);
type Message_Elem_Type is (<>);
type Message_Type is array (Message_Index_Type range <>) of Message_Elem_Type;
type Hash_Index_Type is (<>);
type Hash_Elem_Type is (<>);
type Hash_Type is array (Hash_Index_Type) of Hash_Elem_Type;
function HMAC_SHA256 (Key : Key_Type;
Message : Message_Type) return Hash_Type;
generic
type Key_Index_Type is (<>);
type Key_Elem_Type is (<>);
type Key_Type is array (Key_Index_Type range <>) of Key_Elem_Type;
type Message_Index_Type is (<>);
type Message_Elem_Type is (<>);
type Message_Type is array (Message_Index_Type range <>) of Message_Elem_Type;
type Hash_Index_Type is (<>);
type Hash_Elem_Type is (<>);
type Hash_Type is array (Hash_Index_Type) of Hash_Elem_Type;
function HMAC_SHA384 (Key : Key_Type;
Message : Message_Type) return Hash_Type;
generic
type Key_Index_Type is (<>);
type Key_Elem_Type is (<>);
type Key_Type is array (Key_Index_Type range <>) of Key_Elem_Type;
type Message_Index_Type is (<>);
type Message_Elem_Type is (<>);
type Message_Type is array (Message_Index_Type range <>) of Message_Elem_Type;
type Hash_Index_Type is (<>);
type Hash_Elem_Type is (<>);
type Hash_Type is array (Hash_Index_Type) of Hash_Elem_Type;
function HMAC_SHA512 (Key : Key_Type;
Message : Message_Type) return Hash_Type;
end LSC.SHA2.HMAC_Generic;
|
pchapin/acrypto | Ada | 477 | ads | ---------------------------------------------------------------------------
-- FILE : test_block_ciphers.ads
-- SUBJECT : Specification of test package for block ciphers.
-- AUTHOR : (C) Copyright 2009 by Peter Chapin
--
-- Please send comments or bug reports to
--
-- Peter Chapin <[email protected]>
---------------------------------------------------------------------------
package Test_Block_Ciphers is
procedure Execute;
end Test_Block_Ciphers;
|
VitalijBondarenko/matreshka | Ada | 4,321 | adb |
-- TITLE aflex - main program
--
-- AUTHOR: John Self (UCI)
-- DESCRIPTION main subprogram of aflex, calls the major routines in order
-- $Header: /co/ua/self/arcadia/aflex/ada/src/RCS/aflex.a,v 1.11 90/10/15 20:00:40 self Exp Locker: self $
--***************************************************************************
-- aflex
-- version 1.4a
--***************************************************************************
--
-- Arcadia Project
-- Department of Information and Computer Science
-- University of California
-- Irvine, California 92717
--
-- Send requests for aflex information to [email protected]
--
-- Send bug reports for aflex to [email protected]
--
-- Copyright (c) 1990 Regents of the University of California.
-- All rights reserved.
--
-- This software was developed by John Self of the Arcadia project
-- at the University of California, Irvine.
--
-- Redistribution and use in source and binary forms are permitted
-- provided that the above copyright notice and this paragraph are
-- duplicated in all such forms and that any documentation,
-- advertising materials, and other materials related to such
-- distribution and use acknowledge that the software was developed
-- by the University of California, Irvine. The name of the
-- University may not be used to endorse or promote products derived
-- from this software without specific prior written permission.
-- THIS SOFTWARE IS PROVIDED ``AS IS'' AND WITHOUT ANY EXPRESS OR
-- IMPLIED WARRANTIES, INCLUDING, WITHOUT LIMITATION, THE IMPLIED
-- WARRANTIES OF MERCHANTIBILITY AND FITNESS FOR A PARTICULAR PURPOSE.
--
-- This program is based on the flex program written by Vern Paxson.
--
-- The following is the copyright notice from flex, from which aflex is
-- derived.
-- Copyright (c) 1989 The Regents of the University of California.
-- All rights reserved.
--
-- This code is derived from software contributed to Berkeley by
-- Vern Paxson.
--
-- The United States Government has rights in this work pursuant to
-- contract no. DE-AC03-76SF00098 between the United States Department of
-- Energy and the University of California.
--
-- Redistribution and use in source and binary forms are permitted
-- provided that the above copyright notice and this paragraph are
-- duplicated in all such forms and that any documentation,
-- advertising materials, and other materials related to such
-- distribution and use acknowledge that the software was developed
-- by the University of California, Berkeley. The name of the
-- University may not be used to endorse or promote products derived
-- from this software without specific prior written permission.
-- THIS SOFTWARE IS PROVIDED ``AS IS'' AND WITHOUT ANY EXPRESS OR
-- IMPLIED WARRANTIES, INCLUDING, WITHOUT LIMITATION, THE IMPLIED
-- WARRANTIES OF MERCHANTABILITY AND FITNESS FOR A PARTICULAR PURPOSE.
--
--***************************************************************************
with Ada.Wide_Wide_Text_IO;
with MAIN_BODY, DFA, GEN, MISC_DEFS, MISC;
with TEMPLATE_MANAGER; use MISC_DEFS;
function Aflex return Integer is
use Ada.Wide_Wide_Text_IO;
Copyright : constant String :=
"@(#) Copyright (c) 1990 Regents of the University of California.";
Copyright_2 : constant String :=
"All rights reserved.";
pragma Unreferenced (Copyright, Copyright_2);
begin
MAIN_BODY.Aflex_Init;
MAIN_BODY.READIN;
if (SYNTAXERROR) then
Main_Body.Aflex_End (1);
end if;
if (PERFORMANCE_REPORT) then
if (INTERACTIVE) then
Ada.Wide_Wide_Text_IO.Put_Line
(Ada.Wide_Wide_Text_IO.Standard_Error,
"-I (interactive) entails a minor performance penalty");
end if;
end if;
if (VARIABLE_TRAILING_CONTEXT_RULES) then
Misc.Aflex_Error ("can't handle variable trailing context rules");
end if;
-- convert the ndfa to a dfa
DFA.NTOD;
-- generate the Ada state transition tables from the DFA
GEN.MAKE_TABLES;
TEMPLATE_MANAGER.GENERATE_IO_FILE;
TEMPLATE_MANAGER.GENERATE_DFA_FILE;
Main_Body.Aflex_End (0);
return 0;
exception
when MAIN_BODY.AFLEX_TERMINATE =>
return MAIN_BODY.TERMINATION_STATUS;
end Aflex;
|
sungyeon/drake | Ada | 8,879 | adb | with System.Long_Long_Integer_Types;
with System.Unwind.Raising;
pragma Warnings (Off, System.Unwind.Raising); -- break "pure" rule
package body System.Arith_64 is
pragma Suppress (All_Checks);
use type Interfaces.Integer_64;
use type Interfaces.Unsigned_32;
use type Interfaces.Unsigned_64;
subtype Long_Long_Unsigned is Long_Long_Integer_Types.Long_Long_Unsigned;
pragma Compile_Time_Error (
Long_Long_Integer'Size /= 64,
"Long_Long_Integer is not 64-bit.");
procedure unreachable
with Import,
Convention => Intrinsic, External_Name => "__builtin_unreachable";
pragma No_Return (unreachable);
subtype U32 is Interfaces.Unsigned_32;
subtype U64 is Interfaces.Unsigned_64;
function add_overflow (
a, b : U64;
res : not null access U64)
return Boolean
with Import,
Convention => Intrinsic,
External_Name => "__builtin_uaddll_overflow";
function mul_overflow (
a, b : Interfaces.Integer_64;
res : not null access Interfaces.Integer_64)
return Boolean
with Import,
Convention => Intrinsic,
External_Name => "__builtin_smulll_overflow";
procedure Add (X : U64; R1, R2, R3 : in out U32);
procedure Add (X : U64; R1, R2, R3 : in out U32) is
R : constant U64 := U64 (R1) or Interfaces.Shift_Left (U64 (R2), 32);
XR : aliased U64;
Overflow : Boolean;
begin
Overflow := add_overflow (X, R, XR'Access);
R1 := U32'Mod (XR);
R2 := U32'Mod (Interfaces.Shift_Right (XR, 32));
if Overflow then
R3 := R3 + 1;
end if;
end Add;
procedure Mul (X : U64; Y : U64; RL, RH : out U64);
procedure Mul (X : U64; Y : U64; RL, RH : out U64) is
X1 : constant U32 := U32'Mod (X);
X2 : constant U32 := U32'Mod (Interfaces.Shift_Right (X, 32));
Y1 : constant U32 := U32'Mod (Y);
Y2 : constant U32 := U32'Mod (Interfaces.Shift_Right (Y, 32));
R1, R2, R3, R4 : U32;
begin
declare
R12 : constant U64 := U64 (X1) * U64 (Y1);
begin
R1 := U32'Mod (R12);
R2 := U32'Mod (Interfaces.Shift_Right (R12, 32));
end;
if X2 = 0 and then Y2 = 0 then
R3 := 0;
R4 := 0;
elsif X2 = 0 then
R3 := 0;
R4 := 0;
declare
T23 : constant U64 := U64 (X1) * U64 (Y2);
begin
Add (T23, R2, R3, R4);
end;
elsif Y2 = 0 then
R3 := 0;
R4 := 0;
declare
T23 : constant U64 := U64 (X2) * U64 (Y1);
begin
Add (T23, R2, R3, R4);
end;
else
declare
R34 : constant U64 := U64 (X2) * U64 (Y2);
begin
R3 := U32'Mod (R34);
R4 := U32'Mod (Interfaces.Shift_Right (R34, 32));
end;
declare
T23 : constant U64 := U64 (X1) * U64 (Y2);
begin
Add (T23, R2, R3, R4);
end;
declare
T23 : constant U64 := U64 (X2) * U64 (Y1);
begin
Add (T23, R2, R3, R4);
end;
end if;
RL := U64 (R1) or Interfaces.Shift_Left (U64 (R2), 32);
RH := U64 (R3) or Interfaces.Shift_Left (U64 (R4), 32);
end Mul;
procedure Div (X : U64; Y : U64; Q : out U64; R : out U64);
procedure Div (X : U64; Y : U64; Q : out U64; R : out U64) is
begin
Long_Long_Integer_Types.Divide (
Long_Long_Unsigned (X),
Long_Long_Unsigned (Y),
Long_Long_Unsigned (Q),
Long_Long_Unsigned (R));
end Div;
type Unsigned is mod 2 ** Integer'Size;
function clz (X : U64) return Unsigned
with Import, Convention => Intrinsic, External_Name => "__builtin_clzll";
procedure Div (XL, XH : U64; Y : U64; Q : out U64; R : out U64);
procedure Div (XL, XH : U64; Y : U64; Q : out U64; R : out U64) is
Temp_XL : U64 := XL;
Temp_XH : U64 := XH; -- XH <= 2 ** 62 (abs signed * abs signed)
Rem_Q : U64;
begin
Q := 0;
while Temp_XH > 0 loop
declare
Scaling_W : constant Natural := Natural (clz (Temp_XH) xor 63) + 1;
Scaled_X : U64;
begin
if Scaling_W not in 1 .. 63 then
unreachable;
end if;
Scaled_X := Interfaces.Shift_Left (Temp_XH, 64 - Scaling_W)
or Interfaces.Shift_Right (Temp_XL, Scaling_W);
-- 0 < Scaled_X < 2 ** 63
if Scaled_X < Y then
-- Y <= 2 ** 63 (original Y is signed)
declare
YL : constant U64 := Interfaces.Shift_Left (Y, Scaling_W);
YH : constant U64 :=
Interfaces.Shift_Right (Y, 64 - Scaling_W);
begin
Q := Q + Interfaces.Shift_Left (1, Scaling_W);
if Temp_XL < YL then
Temp_XH := Temp_XH - 1; -- borrow
end if;
Temp_XL := Temp_XL - YL;
Temp_XH := Temp_XH - YH;
end;
else
declare
Temp_Q, Temp_R : U64;
begin
Div (Scaled_X, Y, Temp_Q, Temp_R);
Q := Q + Interfaces.Shift_Left (Temp_Q, Scaling_W);
Temp_XH := Interfaces.Shift_Right (Temp_R, 64 - Scaling_W);
Temp_XL := Interfaces.Shift_Left (Temp_R, Scaling_W)
or (
Temp_XL
and (Interfaces.Shift_Left (1, Scaling_W) - 1));
end;
end if;
end;
end loop;
Div (Temp_XL, Y, Rem_Q, R);
Q := Q + Rem_Q;
end Div;
-- implementation
function Multiply (X, Y : Interfaces.Integer_64)
return Interfaces.Integer_64
is
Result : aliased Interfaces.Integer_64;
begin
if mul_overflow (X, Y, Result'Access) then
Unwind.Raising.Overflow;
end if;
return Result;
end Multiply;
procedure Scaled_Divide (
X, Y, Z : Interfaces.Integer_64;
Q, R : out Interfaces.Integer_64;
Round : Boolean) is
begin
if Z = 0 then
Unwind.Raising.Zero_Division;
end if;
declare
XY_Is_Minus : constant Boolean := (X < 0) /= (Y < 0);
Q_Is_Minus : constant Boolean := XY_Is_Minus /= (Z < 0);
AX : constant U64 := U64'Mod (abs X);
AY : constant U64 := U64'Mod (abs Y);
AZ : constant U64 := U64'Mod (abs Z);
AXYL, AXYH : U64;
AQ, AR : U64;
begin
Mul (AX, AY, AXYL, AXYH);
if AXYH >= AZ then
Unwind.Raising.Overflow;
end if;
Div (AXYL, AXYH, AZ, AQ, AR);
if Round and then AR > (AZ - 1) / 2 then
AQ := AQ + 1;
end if;
if Q_Is_Minus then
if AQ > 2 ** 63 then
Unwind.Raising.Overflow;
end if;
Q := -Interfaces.Integer_64 (AQ);
else
if AQ >= 2 ** 63 then
Unwind.Raising.Overflow;
end if;
Q := Interfaces.Integer_64 (AQ);
end if;
if XY_Is_Minus then
R := -Interfaces.Integer_64 (AR);
else
R := Interfaces.Integer_64 (AR);
end if;
end;
end Scaled_Divide;
procedure Double_Divide (
X, Y, Z : Interfaces.Integer_64;
Q, R : out Interfaces.Integer_64;
Round : Boolean)
is
YZ : aliased Interfaces.Integer_64;
begin
if Y = 0 or else Z = 0 then
Unwind.Raising.Zero_Division;
end if;
if mul_overflow (Y, Z, YZ'Access) then
if X = Interfaces.Integer_64'First
and then (Y = -1 or else Z = -1)
then -- special case, Integer_64'First / (Integer_64'First * -1)
Q := -1;
R := 0;
else
Q := 0;
R := X;
end if;
else
declare
AX : constant U64 := U64'Mod (abs X);
AYZ : constant U64 := U64'Mod (abs YZ);
AQ, AR : U64;
begin
Div (AX, AYZ, AQ, AR);
if Round and then AR > (AYZ - 1) / 2 then
AQ := AQ + 1;
end if;
if (X < 0) /= (YZ <= 0) then
if AQ > 2 ** 63 then
Unwind.Raising.Overflow;
end if;
Q := -Interfaces.Integer_64 (AQ);
else
if AQ >= 2 ** 63 then
Unwind.Raising.Overflow;
end if;
Q := Interfaces.Integer_64 (AQ);
end if;
if X < 0 then
R := -Interfaces.Integer_64 (AR);
else
R := Interfaces.Integer_64 (AR);
end if;
end;
end if;
end Double_Divide;
end System.Arith_64;
|
reznikmm/matreshka | Ada | 4,405 | adb | ------------------------------------------------------------------------------
-- --
-- Matreshka Project --
-- --
-- XML Processor --
-- --
-- Testsuite Component --
-- --
------------------------------------------------------------------------------
-- --
-- Copyright © 2012-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$
------------------------------------------------------------------------------
-- When exception is raised inside Start_Prefix_Mapping callback it wasn't
-- propagated immidiately, but Start_Element was called instead. This test
-- check whether exception is propagated correctly and no other callbacks
-- are called.
------------------------------------------------------------------------------
with League.Strings;
with XML.SAX.Simple_Readers;
with XML.SAX.String_Input_Sources;
with Test_157_Handlers;
procedure Test_157 is
Source : aliased XML.SAX.String_Input_Sources.String_Input_Source;
Handler : aliased Test_157_Handlers.Handler;
Reader : aliased XML.SAX.Simple_Readers.Simple_Reader;
begin
Source.Set_String
(League.Strings.To_Universal_String
("<?xml version='1.0'?>"
& "<xs:schema xmlns:xs='http://www.w3.org/2001/XMLSchema'/>"));
Reader.Set_Content_Handler (Handler'Unchecked_Access);
Reader.Parse (Source'Unchecked_Access);
exception
when Test_157_Handlers.Expected_Error =>
-- Hanlder raises this exception and it must be propagated to here.
null;
end Test_157;
|
reznikmm/matreshka | Ada | 4,647 | adb | ------------------------------------------------------------------------------
-- --
-- Matreshka Project --
-- --
-- Open Document Toolkit --
-- --
-- Runtime Library Component --
-- --
------------------------------------------------------------------------------
-- --
-- Copyright © 2014, Vadim Godunko <[email protected]> --
-- All rights reserved. --
-- --
-- Redistribution and use in source and binary forms, with or without --
-- modification, are permitted provided that the following conditions --
-- are met: --
-- --
-- * Redistributions of source code must retain the above copyright --
-- notice, this list of conditions and the following disclaimer. --
-- --
-- * Redistributions in binary form must reproduce the above copyright --
-- notice, this list of conditions and the following disclaimer in the --
-- documentation and/or other materials provided with the distribution. --
-- --
-- * Neither the name of the Vadim Godunko, IE nor the names of its --
-- contributors may be used to endorse or promote products derived from --
-- this software without specific prior written permission. --
-- --
-- THIS SOFTWARE IS PROVIDED BY THE COPYRIGHT HOLDERS AND CONTRIBUTORS --
-- "AS IS" AND ANY EXPRESS OR IMPLIED WARRANTIES, INCLUDING, BUT NOT --
-- LIMITED TO, THE IMPLIED WARRANTIES OF MERCHANTABILITY AND FITNESS FOR --
-- A PARTICULAR PURPOSE ARE DISCLAIMED. IN NO EVENT SHALL THE COPYRIGHT --
-- HOLDER OR CONTRIBUTORS BE LIABLE FOR ANY DIRECT, INDIRECT, INCIDENTAL, --
-- SPECIAL, EXEMPLARY, OR CONSEQUENTIAL DAMAGES (INCLUDING, BUT NOT LIMITED --
-- TO, PROCUREMENT OF SUBSTITUTE GOODS OR SERVICES; LOSS OF USE, DATA, OR --
-- PROFITS; OR BUSINESS INTERRUPTION) HOWEVER CAUSED AND ON ANY THEORY OF --
-- LIABILITY, WHETHER IN CONTRACT, STRICT LIABILITY, OR TORT (INCLUDING --
-- NEGLIGENCE OR OTHERWISE) ARISING IN ANY WAY OUT OF THE USE OF THIS --
-- SOFTWARE, EVEN IF ADVISED OF THE POSSIBILITY OF SUCH DAMAGE. --
-- --
------------------------------------------------------------------------------
-- $Revision$ $Date$
------------------------------------------------------------------------------
with Matreshka.DOM_Documents;
with Matreshka.ODF_String_Constants;
with ODF.DOM.Iterators;
with ODF.DOM.Visitors;
package body Matreshka.ODF_Draw.Text_Path_Scale_Attributes is
------------
-- Create --
------------
overriding function Create
(Parameters : not null access Matreshka.DOM_Attributes.Attribute_L2_Parameters)
return Draw_Text_Path_Scale_Attribute_Node is
begin
return Self : Draw_Text_Path_Scale_Attribute_Node do
Matreshka.ODF_Draw.Constructors.Initialize
(Self'Unchecked_Access,
Parameters.Document,
Matreshka.ODF_String_Constants.Draw_Prefix);
end return;
end Create;
--------------------
-- Get_Local_Name --
--------------------
overriding function Get_Local_Name
(Self : not null access constant Draw_Text_Path_Scale_Attribute_Node)
return League.Strings.Universal_String
is
pragma Unreferenced (Self);
begin
return Matreshka.ODF_String_Constants.Text_Path_Scale_Attribute;
end Get_Local_Name;
begin
Matreshka.DOM_Documents.Register_Attribute
(Matreshka.ODF_String_Constants.Draw_URI,
Matreshka.ODF_String_Constants.Text_Path_Scale_Attribute,
Draw_Text_Path_Scale_Attribute_Node'Tag);
end Matreshka.ODF_Draw.Text_Path_Scale_Attributes;
|
stcarrez/ada-awa | Ada | 24,675 | ads | -----------------------------------------------------------------------
-- AWA.Counters.Models -- AWA.Counters.Models
-----------------------------------------------------------------------
-- File generated by Dynamo DO NOT MODIFY
-- Template used: templates/model/package-spec.xhtml
-- Ada Generator: https://github.com/stcarrez/dynamo Version 1.4.0
-----------------------------------------------------------------------
-- Copyright (C) 2023 Stephane Carrez
-- Written by Stephane Carrez ([email protected])
--
-- Licensed under the Apache License, Version 2.0 (the "License");
-- you may not use this file except in compliance with the License.
-- You may obtain a copy of the License at
--
-- http://www.apache.org/licenses/LICENSE-2.0
--
-- Unless required by applicable law or agreed to in writing, software
-- distributed under the License is distributed on an "AS IS" BASIS,
-- WITHOUT WARRANTIES OR CONDITIONS OF ANY KIND, either express or implied.
-- See the License for the specific language governing permissions and
-- limitations under the License.
-----------------------------------------------------------------------
pragma Warnings (Off);
with ADO.Sessions;
with ADO.Objects;
with ADO.Statements;
with ADO.SQL;
with ADO.Schemas;
with ADO.Queries;
with ADO.Queries.Loaders;
with Ada.Calendar;
with Ada.Containers.Vectors;
with Ada.Strings.Unbounded;
with Util.Beans.Objects;
with Util.Beans.Basic.Lists;
with Util.Beans.Methods;
pragma Warnings (On);
package AWA.Counters.Models is
pragma Style_Checks ("-mrIu");
type Counter_Ref is new ADO.Objects.Object_Ref with null record;
type Counter_Definition_Ref is new ADO.Objects.Object_Ref with null record;
type Visit_Ref is new ADO.Objects.Object_Ref with null record;
-- Create an object key for Counter.
function Counter_Key (Id : in ADO.Identifier) return ADO.Objects.Object_Key;
-- Create an object key for Counter from a string.
-- Raises Constraint_Error if the string cannot be converted into the object key.
function Counter_Key (Id : in String) return ADO.Objects.Object_Key;
Null_Counter : constant Counter_Ref;
function "=" (Left, Right : Counter_Ref'Class) return Boolean;
-- Set the object associated with the counter.
procedure Set_Object_Id (Object : in out Counter_Ref;
Value : in ADO.Identifier);
-- Get the object associated with the counter.
function Get_Object_Id (Object : in Counter_Ref)
return ADO.Identifier;
-- Set the day associated with the counter.
procedure Set_Date (Object : in out Counter_Ref;
Value : in Ada.Calendar.Time);
-- Get the day associated with the counter.
function Get_Date (Object : in Counter_Ref)
return Ada.Calendar.Time;
-- Set the counter value.
procedure Set_Counter (Object : in out Counter_Ref;
Value : in Integer);
-- Get the counter value.
function Get_Counter (Object : in Counter_Ref)
return Integer;
-- Set the counter definition identifier.
procedure Set_Definition_Id (Object : in out Counter_Ref;
Value : in ADO.Identifier);
-- Get the counter definition identifier.
function Get_Definition_Id (Object : in Counter_Ref)
return ADO.Identifier;
-- Load the entity identified by 'Id'.
-- Raises the NOT_FOUND exception if it does not exist.
procedure Load (Object : in out Counter_Ref;
Session : in out ADO.Sessions.Session'Class;
Id : in ADO.Identifier);
-- Load the entity identified by 'Id'.
-- Returns True in <b>Found</b> if the object was found and False if it does not exist.
procedure Load (Object : in out Counter_Ref;
Session : in out ADO.Sessions.Session'Class;
Id : in ADO.Identifier;
Found : out Boolean);
-- Find and load the entity.
overriding
procedure Find (Object : in out Counter_Ref;
Session : in out ADO.Sessions.Session'Class;
Query : in ADO.SQL.Query'Class;
Found : out Boolean);
-- Save the entity. If the entity does not have an identifier, an identifier is allocated
-- and it is inserted in the table. Otherwise, only data fields which have been changed
-- are updated.
overriding
procedure Save (Object : in out Counter_Ref;
Session : in out ADO.Sessions.Master_Session'Class);
-- Delete the entity.
overriding
procedure Delete (Object : in out Counter_Ref;
Session : in out ADO.Sessions.Master_Session'Class);
overriding
function Get_Value (From : in Counter_Ref;
Name : in String) return Util.Beans.Objects.Object;
-- Table definition
COUNTER_TABLE : constant ADO.Schemas.Class_Mapping_Access;
-- Internal method to allocate the Object_Record instance
overriding
procedure Allocate (Object : in out Counter_Ref);
-- Copy of the object.
procedure Copy (Object : in Counter_Ref;
Into : in out Counter_Ref);
-- --------------------
-- A counter definition defines what the counter represents. It uniquely identifies
-- the counter for the Counter table. A counter may be associated with a database
-- table. In that case, the counter definition has a relation to the corresponding Entity_Type.
-- --------------------
-- Create an object key for Counter_Definition.
function Counter_Definition_Key (Id : in ADO.Identifier) return ADO.Objects.Object_Key;
-- Create an object key for Counter_Definition from a string.
-- Raises Constraint_Error if the string cannot be converted into the object key.
function Counter_Definition_Key (Id : in String) return ADO.Objects.Object_Key;
Null_Counter_Definition : constant Counter_Definition_Ref;
function "=" (Left, Right : Counter_Definition_Ref'Class) return Boolean;
-- Set the counter name.
procedure Set_Name (Object : in out Counter_Definition_Ref;
Value : in Ada.Strings.Unbounded.Unbounded_String);
procedure Set_Name (Object : in out Counter_Definition_Ref;
Value : in String);
-- Get the counter name.
function Get_Name (Object : in Counter_Definition_Ref)
return Ada.Strings.Unbounded.Unbounded_String;
function Get_Name (Object : in Counter_Definition_Ref)
return String;
-- Set the counter unique id.
procedure Set_Id (Object : in out Counter_Definition_Ref;
Value : in ADO.Identifier);
-- Get the counter unique id.
function Get_Id (Object : in Counter_Definition_Ref)
return ADO.Identifier;
-- Set the optional entity type that identifies the database table.
procedure Set_Entity_Type (Object : in out Counter_Definition_Ref;
Value : in ADO.Nullable_Entity_Type);
-- Get the optional entity type that identifies the database table.
function Get_Entity_Type (Object : in Counter_Definition_Ref)
return ADO.Nullable_Entity_Type;
-- Load the entity identified by 'Id'.
-- Raises the NOT_FOUND exception if it does not exist.
procedure Load (Object : in out Counter_Definition_Ref;
Session : in out ADO.Sessions.Session'Class;
Id : in ADO.Identifier);
-- Load the entity identified by 'Id'.
-- Returns True in <b>Found</b> if the object was found and False if it does not exist.
procedure Load (Object : in out Counter_Definition_Ref;
Session : in out ADO.Sessions.Session'Class;
Id : in ADO.Identifier;
Found : out Boolean);
-- Find and load the entity.
overriding
procedure Find (Object : in out Counter_Definition_Ref;
Session : in out ADO.Sessions.Session'Class;
Query : in ADO.SQL.Query'Class;
Found : out Boolean);
-- Save the entity. If the entity does not have an identifier, an identifier is allocated
-- and it is inserted in the table. Otherwise, only data fields which have been changed
-- are updated.
overriding
procedure Save (Object : in out Counter_Definition_Ref;
Session : in out ADO.Sessions.Master_Session'Class);
-- Delete the entity.
overriding
procedure Delete (Object : in out Counter_Definition_Ref;
Session : in out ADO.Sessions.Master_Session'Class);
overriding
function Get_Value (From : in Counter_Definition_Ref;
Name : in String) return Util.Beans.Objects.Object;
-- Table definition
COUNTER_DEFINITION_TABLE : constant ADO.Schemas.Class_Mapping_Access;
-- Internal method to allocate the Object_Record instance
overriding
procedure Allocate (Object : in out Counter_Definition_Ref);
-- Copy of the object.
procedure Copy (Object : in Counter_Definition_Ref;
Into : in out Counter_Definition_Ref);
-- Create an object key for Visit.
function Visit_Key (Id : in ADO.Identifier) return ADO.Objects.Object_Key;
-- Create an object key for Visit from a string.
-- Raises Constraint_Error if the string cannot be converted into the object key.
function Visit_Key (Id : in String) return ADO.Objects.Object_Key;
Null_Visit : constant Visit_Ref;
function "=" (Left, Right : Visit_Ref'Class) return Boolean;
-- Set the entity identifier.
procedure Set_Object_Id (Object : in out Visit_Ref;
Value : in ADO.Identifier);
-- Get the entity identifier.
function Get_Object_Id (Object : in Visit_Ref)
return ADO.Identifier;
-- Set the number of times the entity was visited by the user.
procedure Set_Counter (Object : in out Visit_Ref;
Value : in Integer);
-- Get the number of times the entity was visited by the user.
function Get_Counter (Object : in Visit_Ref)
return Integer;
-- Set the date and time when the entity was last visited.
procedure Set_Date (Object : in out Visit_Ref;
Value : in Ada.Calendar.Time);
-- Get the date and time when the entity was last visited.
function Get_Date (Object : in Visit_Ref)
return Ada.Calendar.Time;
-- Set the user who visited the entity.
procedure Set_User (Object : in out Visit_Ref;
Value : in ADO.Identifier);
-- Get the user who visited the entity.
function Get_User (Object : in Visit_Ref)
return ADO.Identifier;
-- Set the counter definition identifier.
procedure Set_Definition_Id (Object : in out Visit_Ref;
Value : in ADO.Identifier);
-- Get the counter definition identifier.
function Get_Definition_Id (Object : in Visit_Ref)
return ADO.Identifier;
-- Load the entity identified by 'Id'.
-- Raises the NOT_FOUND exception if it does not exist.
procedure Load (Object : in out Visit_Ref;
Session : in out ADO.Sessions.Session'Class;
Id : in ADO.Identifier);
-- Load the entity identified by 'Id'.
-- Returns True in <b>Found</b> if the object was found and False if it does not exist.
procedure Load (Object : in out Visit_Ref;
Session : in out ADO.Sessions.Session'Class;
Id : in ADO.Identifier;
Found : out Boolean);
-- Find and load the entity.
overriding
procedure Find (Object : in out Visit_Ref;
Session : in out ADO.Sessions.Session'Class;
Query : in ADO.SQL.Query'Class;
Found : out Boolean);
-- Save the entity. If the entity does not have an identifier, an identifier is allocated
-- and it is inserted in the table. Otherwise, only data fields which have been changed
-- are updated.
overriding
procedure Save (Object : in out Visit_Ref;
Session : in out ADO.Sessions.Master_Session'Class);
-- Delete the entity.
overriding
procedure Delete (Object : in out Visit_Ref;
Session : in out ADO.Sessions.Master_Session'Class);
overriding
function Get_Value (From : in Visit_Ref;
Name : in String) return Util.Beans.Objects.Object;
-- Table definition
VISIT_TABLE : constant ADO.Schemas.Class_Mapping_Access;
-- Internal method to allocate the Object_Record instance
overriding
procedure Allocate (Object : in out Visit_Ref);
-- Copy of the object.
procedure Copy (Object : in Visit_Ref;
Into : in out Visit_Ref);
package Visit_Vectors is
new Ada.Containers.Vectors (Index_Type => Positive,
Element_Type => Visit_Ref,
"=" => "=");
subtype Visit_Vector is Visit_Vectors.Vector;
procedure List (Object : in out Visit_Vector;
Session : in out ADO.Sessions.Session'Class;
Query : in ADO.SQL.Query'Class);
-- --------------------
-- The month statistics.
-- --------------------
type Stat_Info is
new Util.Beans.Basic.Bean with record
-- the counter date.
Date : Ada.Calendar.Time;
-- the counter value.
Count : Natural;
end record;
-- Get the bean attribute identified by the name.
overriding
function Get_Value (From : in Stat_Info;
Name : in String) return Util.Beans.Objects.Object;
-- Set the bean attribute identified by the name.
overriding
procedure Set_Value (Item : in out Stat_Info;
Name : in String;
Value : in Util.Beans.Objects.Object);
package Stat_Info_Beans is
new Util.Beans.Basic.Lists (Element_Type => Stat_Info);
package Stat_Info_Vectors renames Stat_Info_Beans.Vectors;
subtype Stat_Info_List_Bean is Stat_Info_Beans.List_Bean;
type Stat_Info_List_Bean_Access is access all Stat_Info_List_Bean;
-- Run the query controlled by <b>Context</b> and append the list in <b>Object</b>.
procedure List (Object : in out Stat_Info_List_Bean'Class;
Session : in out ADO.Sessions.Session'Class;
Context : in out ADO.Queries.Context'Class);
subtype Stat_Info_Vector is Stat_Info_Vectors.Vector;
-- Run the query controlled by <b>Context</b> and append the list in <b>Object</b>.
procedure List (Object : in out Stat_Info_Vector;
Session : in out ADO.Sessions.Session'Class;
Context : in out ADO.Queries.Context'Class);
Query_Counter_Update : constant ADO.Queries.Query_Definition_Access;
Query_Counter_Update_Field : constant ADO.Queries.Query_Definition_Access;
-- --------------------
-- The Stat_List_Bean is the bean that allows to retrieve the counter statistics
-- for a given database entity and provide the values through a bean to the
-- presentation layer.load the counters for the entity and the timeframe.
-- --------------------
type Stat_List_Bean is abstract limited
new Util.Beans.Basic.Bean and Util.Beans.Methods.Method_Bean with record
-- the entity type name.
Entity_Type : Ada.Strings.Unbounded.Unbounded_String;
-- the first date.
First_Date : Ada.Strings.Unbounded.Unbounded_String;
-- the last date.
Last_Date : Ada.Strings.Unbounded.Unbounded_String;
-- the entity identifier.
Entity_Id : ADO.Identifier;
Counter_Name : Ada.Strings.Unbounded.Unbounded_String;
Query_Name : Ada.Strings.Unbounded.Unbounded_String;
end record;
-- This bean provides some methods that can be used in a Method_Expression.
overriding
function Get_Method_Bindings (From : in Stat_List_Bean)
return Util.Beans.Methods.Method_Binding_Array_Access;
-- Get the bean attribute identified by the name.
overriding
function Get_Value (From : in Stat_List_Bean;
Name : in String) return Util.Beans.Objects.Object;
-- Set the bean attribute identified by the name.
overriding
procedure Set_Value (Item : in out Stat_List_Bean;
Name : in String;
Value : in Util.Beans.Objects.Object);
procedure Load (Bean : in out Stat_List_Bean;
Outcome : in out Ada.Strings.Unbounded.Unbounded_String) is abstract;
private
COUNTER_NAME : aliased constant String := "awa_counter";
COL_0_1_NAME : aliased constant String := "object_id";
COL_1_1_NAME : aliased constant String := "date";
COL_2_1_NAME : aliased constant String := "counter";
COL_3_1_NAME : aliased constant String := "definition_id";
COUNTER_DEF : aliased constant ADO.Schemas.Class_Mapping :=
(Count => 4,
Table => COUNTER_NAME'Access,
Members => (
1 => COL_0_1_NAME'Access,
2 => COL_1_1_NAME'Access,
3 => COL_2_1_NAME'Access,
4 => COL_3_1_NAME'Access)
);
COUNTER_TABLE : constant ADO.Schemas.Class_Mapping_Access
:= COUNTER_DEF'Access;
Null_Counter : constant Counter_Ref
:= Counter_Ref'(ADO.Objects.Object_Ref with null record);
type Counter_Impl is
new ADO.Objects.Object_Record (Key_Type => ADO.Objects.KEY_INTEGER,
Of_Class => COUNTER_DEF'Access)
with record
Object_Id : ADO.Identifier;
Date : Ada.Calendar.Time;
Counter : Integer;
end record;
type Counter_Access is access all Counter_Impl;
overriding
procedure Destroy (Object : access Counter_Impl);
overriding
procedure Find (Object : in out Counter_Impl;
Session : in out ADO.Sessions.Session'Class;
Query : in ADO.SQL.Query'Class;
Found : out Boolean);
overriding
procedure Load (Object : in out Counter_Impl;
Session : in out ADO.Sessions.Session'Class);
procedure Load (Object : in out Counter_Impl;
Stmt : in out ADO.Statements.Query_Statement'Class;
Session : in out ADO.Sessions.Session'Class);
overriding
procedure Save (Object : in out Counter_Impl;
Session : in out ADO.Sessions.Master_Session'Class);
overriding
procedure Create (Object : in out Counter_Impl;
Session : in out ADO.Sessions.Master_Session'Class);
overriding
procedure Delete (Object : in out Counter_Impl;
Session : in out ADO.Sessions.Master_Session'Class);
procedure Set_Field (Object : in out Counter_Ref'Class;
Impl : out Counter_Access);
COUNTER_DEFINITION_NAME : aliased constant String := "awa_counter_definition";
COL_0_2_NAME : aliased constant String := "name";
COL_1_2_NAME : aliased constant String := "id";
COL_2_2_NAME : aliased constant String := "entity_type";
COUNTER_DEFINITION_DEF : aliased constant ADO.Schemas.Class_Mapping :=
(Count => 3,
Table => COUNTER_DEFINITION_NAME'Access,
Members => (
1 => COL_0_2_NAME'Access,
2 => COL_1_2_NAME'Access,
3 => COL_2_2_NAME'Access)
);
COUNTER_DEFINITION_TABLE : constant ADO.Schemas.Class_Mapping_Access
:= COUNTER_DEFINITION_DEF'Access;
Null_Counter_Definition : constant Counter_Definition_Ref
:= Counter_Definition_Ref'(ADO.Objects.Object_Ref with null record);
type Counter_Definition_Impl is
new ADO.Objects.Object_Record (Key_Type => ADO.Objects.KEY_INTEGER,
Of_Class => COUNTER_DEFINITION_DEF'Access)
with record
Name : Ada.Strings.Unbounded.Unbounded_String;
Entity_Type : ADO.Nullable_Entity_Type;
end record;
type Counter_Definition_Access is access all Counter_Definition_Impl;
overriding
procedure Destroy (Object : access Counter_Definition_Impl);
overriding
procedure Find (Object : in out Counter_Definition_Impl;
Session : in out ADO.Sessions.Session'Class;
Query : in ADO.SQL.Query'Class;
Found : out Boolean);
overriding
procedure Load (Object : in out Counter_Definition_Impl;
Session : in out ADO.Sessions.Session'Class);
procedure Load (Object : in out Counter_Definition_Impl;
Stmt : in out ADO.Statements.Query_Statement'Class;
Session : in out ADO.Sessions.Session'Class);
overriding
procedure Save (Object : in out Counter_Definition_Impl;
Session : in out ADO.Sessions.Master_Session'Class);
overriding
procedure Create (Object : in out Counter_Definition_Impl;
Session : in out ADO.Sessions.Master_Session'Class);
overriding
procedure Delete (Object : in out Counter_Definition_Impl;
Session : in out ADO.Sessions.Master_Session'Class);
procedure Set_Field (Object : in out Counter_Definition_Ref'Class;
Impl : out Counter_Definition_Access);
VISIT_NAME : aliased constant String := "awa_visit";
COL_0_3_NAME : aliased constant String := "object_id";
COL_1_3_NAME : aliased constant String := "counter";
COL_2_3_NAME : aliased constant String := "date";
COL_3_3_NAME : aliased constant String := "user";
COL_4_3_NAME : aliased constant String := "definition_id";
VISIT_DEF : aliased constant ADO.Schemas.Class_Mapping :=
(Count => 5,
Table => VISIT_NAME'Access,
Members => (
1 => COL_0_3_NAME'Access,
2 => COL_1_3_NAME'Access,
3 => COL_2_3_NAME'Access,
4 => COL_3_3_NAME'Access,
5 => COL_4_3_NAME'Access)
);
VISIT_TABLE : constant ADO.Schemas.Class_Mapping_Access
:= VISIT_DEF'Access;
Null_Visit : constant Visit_Ref
:= Visit_Ref'(ADO.Objects.Object_Ref with null record);
type Visit_Impl is
new ADO.Objects.Object_Record (Key_Type => ADO.Objects.KEY_INTEGER,
Of_Class => VISIT_DEF'Access)
with record
Object_Id : ADO.Identifier;
Counter : Integer;
Date : Ada.Calendar.Time;
User : ADO.Identifier;
end record;
type Visit_Access is access all Visit_Impl;
overriding
procedure Destroy (Object : access Visit_Impl);
overriding
procedure Find (Object : in out Visit_Impl;
Session : in out ADO.Sessions.Session'Class;
Query : in ADO.SQL.Query'Class;
Found : out Boolean);
overriding
procedure Load (Object : in out Visit_Impl;
Session : in out ADO.Sessions.Session'Class);
procedure Load (Object : in out Visit_Impl;
Stmt : in out ADO.Statements.Query_Statement'Class;
Session : in out ADO.Sessions.Session'Class);
overriding
procedure Save (Object : in out Visit_Impl;
Session : in out ADO.Sessions.Master_Session'Class);
overriding
procedure Create (Object : in out Visit_Impl;
Session : in out ADO.Sessions.Master_Session'Class);
overriding
procedure Delete (Object : in out Visit_Impl;
Session : in out ADO.Sessions.Master_Session'Class);
procedure Set_Field (Object : in out Visit_Ref'Class;
Impl : out Visit_Access);
package File_1 is
new ADO.Queries.Loaders.File (Path => "counter-update.xml",
Sha1 => "6C157006E7A28699E1FE0E2CB571BACA2706E58D");
package Def_Statinfo_Counter_Update is
new ADO.Queries.Loaders.Query (Name => "counter-update",
File => File_1.File'Access);
Query_Counter_Update : constant ADO.Queries.Query_Definition_Access
:= Def_Statinfo_Counter_Update.Query'Access;
package Def_Statinfo_Counter_Update_Field is
new ADO.Queries.Loaders.Query (Name => "counter-update-field",
File => File_1.File'Access);
Query_Counter_Update_Field : constant ADO.Queries.Query_Definition_Access
:= Def_Statinfo_Counter_Update_Field.Query'Access;
end AWA.Counters.Models;
|
BrickBot/Bound-T-H8-300 | Ada | 3,076 | adb | -- Options.May_Modular_Integer (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:50 $
--
-- $Log: options-may_modular_integer.adb,v $
-- Revision 1.2 2015/10/24 20:05:50 niklas
-- Moved to free licence.
--
-- Revision 1.1 2014/06/01 10:36:37 niklas
-- First version.
--
package body Options.May_Modular_Integer is
overriding
function Type_And_Default (Option : access Option_T)
return String
is
begin
return Type_Alone (Option)
& ", not defined by default";
end Type_And_Default;
overriding
procedure Reset (Option : access Option_T)
is
begin
Option.Set := False;
end Reset;
overriding
procedure Set (
Option : access Option_T;
Value : in String)
is
begin
Number_Valued.Set (
Option => Number_Valued.Option_T (Option.all)'Access,
Value => Value);
Option.Set := True;
exception
when Constraint_Error =>
Option.Set := False;
raise;
end Set;
function Set (Value : Value_Type) return Option_T
is
begin
return (
Number_Valued.Option_T'(
Default => Value,
Value => Value)
with
Set => True);
end Set;
end Options.May_Modular_Integer;
|
charlie5/aIDE | Ada | 1,421 | ads | with
AdaM.Entity,
Ada.Containers.Vectors,
Ada.Streams;
package AdaM.Declaration
is
type Item is new Entity.item with private;
-- View
--
type View is access all Item'Class;
procedure View_write (Stream : not null access Ada.Streams.Root_Stream_Type'Class;
Self : in View);
procedure View_read (Stream : not null access Ada.Streams.Root_Stream_Type'Class;
Self : out View);
for View'write use View_write;
for View'read use View_read;
-- Vector
--
package Vectors is new ada.Containers.Vectors (Positive, View);
subtype Vector is Vectors.Vector;
-- Forge
--
function new_Subprogram return Declaration.view;
procedure free (Self : in out Declaration.view);
procedure destruct (Self : in out Declaration.item);
-- Attributes
--
overriding
function Id (Self : access Item) return AdaM.Id;
procedure Name_is (Self : in out Item; Now : in Identifier);
overriding
function Name (Self : in Item) return Identifier;
-- function full_Name (Self : in Item) return String;
overriding
function to_Source (Self : in Item) return text_Vectors.Vector;
private
type Item is new Entity.item with
record
Name : Text;
end record;
end AdaM.Declaration;
|
Fabien-Chouteau/tiled-code-gen | Ada | 4,055 | ads | ------------------------------------------------------------------------------
-- --
-- tiled-code-gen --
-- --
-- Copyright (C) 2018 Fabien Chouteau --
-- --
-- --
-- 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 package handles the collision shapes of tiles
--
-- The shapes are loaded from the tileset file in the Collisions objects and
-- users can then test if a given point is within one of the shapes.
with DOM.Core;
private with GNATCOLL.Geometry;
private with Ada.Containers.Doubly_Linked_Lists;
package TCG.Collision_Objects is
type Collisions is limited private;
procedure Load (This : in out Collisions;
N : DOM.Core.Node);
function Has_Collision (This : Collisions)
return Boolean;
-- Return true if there is at least one collision shape
function Collide (This : Collisions;
X, Y : Float)
return Boolean;
-- Return True if this coordinate is in one of the collision shapes
private
package Geometry is new GNATCOLL.Geometry (Float);
use Geometry;
type Shape_Kind is (Rectangle_Shape, Ellipse_Shape, Polygon_Shape);
type Collision_Shape (Kind : Shape_Kind := Rectangle_Shape) is record
case Kind is
when Rectangle_Shape | Ellipse_Shape =>
Rect : Polygon (1 .. 4);
when Polygon_Shape =>
Poly : not null access Polygon;
end case;
end record;
package Shape_List_Pck is new Ada.Containers.Doubly_Linked_Lists
(Collision_Shape);
type Collisions is limited record
List : Shape_List_Pck.List;
end record;
end TCG.Collision_Objects;
|
sungyeon/drake | Ada | 530 | ads | pragma License (Unrestricted);
-- implementation unit specialized for POSIX (Darwin, FreeBSD, or Linux)
with Ada.Interrupts;
package System.Native_Interrupts.Vector is
subtype Parameterless_Handler is Ada.Interrupts.Parameterless_Handler;
function Current_Handler (Interrupt : Interrupt_Id)
return Parameterless_Handler;
procedure Exchange_Handler (
Old_Handler : out Parameterless_Handler;
New_Handler : Parameterless_Handler;
Interrupt : Interrupt_Id);
end System.Native_Interrupts.Vector;
|
io7m/coreland-vector-ada | Ada | 523 | ads | generic package vector.div_scalar is
-- div scalar, in place
procedure f
(a : in out vector_f_t;
sc : scalar_f_t);
pragma inline (f);
procedure d
(a : in out vector_d_t;
sc : scalar_d_t);
pragma inline (d);
-- div scalar, external storage
procedure f_ext
(a : in vector_f_t;
x : out vector_f_t;
sc : scalar_f_t);
pragma inline (f_ext);
procedure d_ext
(a : in vector_d_t;
x : out vector_d_t;
sc : scalar_d_t);
pragma inline (d_ext);
end vector.div_scalar;
|
zhmu/ananas | Ada | 6,508 | adb | ------------------------------------------------------------------------------
-- --
-- GNAT RUN-TIME COMPONENTS --
-- --
-- A D A . T E X T _ I O . M O D U L A R _ I O --
-- --
-- B o d y --
-- --
-- Copyright (C) 1992-2022, Free Software Foundation, Inc. --
-- --
-- GNAT is free software; you can redistribute it and/or modify it under --
-- terms of the GNU General Public License as published by the Free Soft- --
-- ware Foundation; either version 3, or (at your option) any later ver- --
-- sion. GNAT is distributed in the hope that it will be useful, but WITH- --
-- OUT ANY WARRANTY; without even the implied warranty of MERCHANTABILITY --
-- or FITNESS FOR A PARTICULAR PURPOSE. --
-- --
-- As a special exception under Section 7 of GPL version 3, you are granted --
-- additional permissions described in the GCC Runtime Library Exception, --
-- version 3.1, as published by the Free Software Foundation. --
-- --
-- You should have received a copy of the GNU General Public License and --
-- a copy of the GCC Runtime Library Exception along with this program; --
-- see the files COPYING3 and COPYING.RUNTIME respectively. If not, see --
-- <http://www.gnu.org/licenses/>. --
-- --
-- GNAT was originally developed by the GNAT team at New York University. --
-- Extensive contributions were provided by Ada Core Technologies Inc. --
-- --
------------------------------------------------------------------------------
with Ada.Text_IO.Integer_Aux;
with System.Img_BIU; use System.Img_BIU;
with System.Img_Uns; use System.Img_Uns;
with System.Img_LLB; use System.Img_LLB;
with System.Img_LLU; use System.Img_LLU;
with System.Img_LLW; use System.Img_LLW;
with System.Img_LLLB; use System.Img_LLLB;
with System.Img_LLLU; use System.Img_LLLU;
with System.Img_LLLW; use System.Img_LLLW;
with System.Img_WIU; use System.Img_WIU;
with System.Val_Uns; use System.Val_Uns;
with System.Val_LLU; use System.Val_LLU;
with System.Val_LLLU; use System.Val_LLLU;
package body Ada.Text_IO.Modular_IO is
package Aux_Uns is new
Ada.Text_IO.Integer_Aux
(Unsigned,
Scan_Unsigned,
Set_Image_Unsigned,
Set_Image_Width_Unsigned,
Set_Image_Based_Unsigned);
package Aux_LLU is new
Ada.Text_IO.Integer_Aux
(Long_Long_Unsigned,
Scan_Long_Long_Unsigned,
Set_Image_Long_Long_Unsigned,
Set_Image_Width_Long_Long_Unsigned,
Set_Image_Based_Long_Long_Unsigned);
package Aux_LLLU is new
Ada.Text_IO.Integer_Aux
(Long_Long_Long_Unsigned,
Scan_Long_Long_Long_Unsigned,
Set_Image_Long_Long_Long_Unsigned,
Set_Image_Width_Long_Long_Long_Unsigned,
Set_Image_Based_Long_Long_Long_Unsigned);
Need_LLU : constant Boolean := Num'Base'Size > Unsigned'Size;
Need_LLLU : constant Boolean := Num'Base'Size > Long_Long_Unsigned'Size;
-- Throughout this generic body, we distinguish between cases where type
-- Unsigned is acceptable, where type Long_Long_Unsigned is acceptable and
-- where type Long_Long_Long_Unsigned is needed. These boolean constants
-- are used to test for these cases and since they are constant, only code
-- for the relevant case will be included in the instance.
---------
-- Get --
---------
procedure Get
(File : File_Type;
Item : out Num;
Width : Field := 0)
is
-- We depend on a range check to get Data_Error
pragma Unsuppress (Range_Check);
begin
if Need_LLLU then
Aux_LLLU.Get (File, Long_Long_Long_Unsigned (Item), Width);
elsif Need_LLU then
Aux_LLU.Get (File, Long_Long_Unsigned (Item), Width);
else
Aux_Uns.Get (File, Unsigned (Item), Width);
end if;
exception
when Constraint_Error => raise Data_Error;
end Get;
procedure Get
(Item : out Num;
Width : Field := 0)
is
begin
Get (Current_In, Item, Width);
end Get;
procedure Get
(From : String;
Item : out Num;
Last : out Positive)
is
-- We depend on a range check to get Data_Error
pragma Unsuppress (Range_Check);
begin
if Need_LLLU then
Aux_LLLU.Gets (From, Long_Long_Long_Unsigned (Item), Last);
elsif Need_LLU then
Aux_LLU.Gets (From, Long_Long_Unsigned (Item), Last);
else
Aux_Uns.Gets (From, Unsigned (Item), Last);
end if;
exception
when Constraint_Error => raise Data_Error;
end Get;
---------
-- Put --
---------
procedure Put
(File : File_Type;
Item : Num;
Width : Field := Default_Width;
Base : Number_Base := Default_Base)
is
begin
if Need_LLLU then
Aux_LLLU.Put (File, Long_Long_Long_Unsigned (Item), Width, Base);
elsif Need_LLU then
Aux_LLU.Put (File, Long_Long_Unsigned (Item), Width, Base);
else
Aux_Uns.Put (File, Unsigned (Item), Width, Base);
end if;
end Put;
procedure Put
(Item : Num;
Width : Field := Default_Width;
Base : Number_Base := Default_Base)
is
begin
Put (Current_Out, Item, Width, Base);
end Put;
procedure Put
(To : out String;
Item : Num;
Base : Number_Base := Default_Base)
is
begin
if Need_LLLU then
Aux_LLLU.Puts (To, Long_Long_Long_Unsigned (Item), Base);
elsif Need_LLU then
Aux_LLU.Puts (To, Long_Long_Unsigned (Item), Base);
else
Aux_Uns.Puts (To, Unsigned (Item), Base);
end if;
end Put;
end Ada.Text_IO.Modular_IO;
|
reznikmm/matreshka | Ada | 4,074 | ads | ------------------------------------------------------------------------------
-- --
-- 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$
------------------------------------------------------------------------------
with WebAPI.UI_Events.Wheel;
package WUI.Events.Mouse.Wheel is
pragma Preelaborate;
type Mouse_Wheel_Event is
new WUI.Events.Mouse.Abstract_Mouse_Event with private;
function Delta_X (Self : Mouse_Wheel_Event'Class) return Long_Float;
function Delta_Y (Self : Mouse_Wheel_Event'Class) return Long_Float;
function Delta_Z (Self : Mouse_Wheel_Event'Class) return Long_Float;
package Constructors is
procedure Initialize
(Self : in out Mouse_Wheel_Event'Class;
Event : not null access WebAPI.UI_Events.Wheel.Wheel_Event'Class);
end Constructors;
private
type Mouse_Wheel_Event is
new WUI.Events.Mouse.Abstract_Mouse_Event with null record;
end WUI.Events.Mouse.Wheel;
|
stcarrez/ada-asf | Ada | 1,339 | ads | -----------------------------------------------------------------------
-- asf-requests-tests - Unit tests for requests
-- Copyright (C) 2012, 2015 Stephane Carrez
-- Written by Stephane Carrez ([email protected])
--
-- Licensed under the Apache License, Version 2.0 (the "License");
-- you may not use this file except in compliance with the License.
-- You may obtain a copy of the License at
--
-- http://www.apache.org/licenses/LICENSE-2.0
--
-- Unless required by applicable law or agreed to in writing, software
-- distributed under the License is distributed on an "AS IS" BASIS,
-- WITHOUT WARRANTIES OR CONDITIONS OF ANY KIND, either express or implied.
-- See the License for the specific language governing permissions and
-- limitations under the License.
-----------------------------------------------------------------------
with Util.Tests;
package ASF.Requests.Tests is
procedure Add_Tests (Suite : in Util.Tests.Access_Test_Suite);
type Test is new Util.Tests.Test with null record;
-- Test the Split_Header procedure.
procedure Test_Split_Header (T : in out Test);
-- Test the Accept_Locales procedure.
procedure Test_Accept_Locales (T : in out Test);
-- Test the Set_Attribute procedure.
procedure Test_Set_Attribute (T : in out Test);
end ASF.Requests.Tests;
|
tum-ei-rcs/StratoX | Ada | 6,331 | ads | -- This spec has been automatically generated from STM32F40x.svd
pragma Restrictions (No_Elaboration_Code);
pragma Ada_2012;
with System;
-- STM32F40x
package STM32_SVD is
pragma Preelaborate;
--------------------
-- Base addresses --
--------------------
RNG_Base : constant System.Address :=
System'To_Address (16#50060800#);
DCMI_Base : constant System.Address :=
System'To_Address (16#50050000#);
FSMC_Base : constant System.Address :=
System'To_Address (16#A0000000#);
DBG_Base : constant System.Address :=
System'To_Address (16#E0042000#);
DMA2_Base : constant System.Address :=
System'To_Address (16#40026400#);
DMA1_Base : constant System.Address :=
System'To_Address (16#40026000#);
RCC_Base : constant System.Address :=
System'To_Address (16#40023800#);
GPIOI_Base : constant System.Address :=
System'To_Address (16#40022000#);
GPIOH_Base : constant System.Address :=
System'To_Address (16#40021C00#);
GPIOG_Base : constant System.Address :=
System'To_Address (16#40021800#);
GPIOF_Base : constant System.Address :=
System'To_Address (16#40021400#);
GPIOE_Base : constant System.Address :=
System'To_Address (16#40021000#);
GPIOD_Base : constant System.Address :=
System'To_Address (16#40020C00#);
GPIOC_Base : constant System.Address :=
System'To_Address (16#40020800#);
GPIOB_Base : constant System.Address :=
System'To_Address (16#40020400#);
GPIOA_Base : constant System.Address :=
System'To_Address (16#40020000#);
SYSCFG_Base : constant System.Address :=
System'To_Address (16#40013800#);
SPI1_Base : constant System.Address :=
System'To_Address (16#40013000#);
SPI2_Base : constant System.Address :=
System'To_Address (16#40003800#);
SPI3_Base : constant System.Address :=
System'To_Address (16#40003C00#);
I2S2ext_Base : constant System.Address :=
System'To_Address (16#40003400#);
I2S3ext_Base : constant System.Address :=
System'To_Address (16#40004000#);
SDIO_Base : constant System.Address :=
System'To_Address (16#40012C00#);
ADC1_Base : constant System.Address :=
System'To_Address (16#40012000#);
ADC2_Base : constant System.Address :=
System'To_Address (16#40012100#);
ADC3_Base : constant System.Address :=
System'To_Address (16#40012200#);
USART6_Base : constant System.Address :=
System'To_Address (16#40011400#);
USART1_Base : constant System.Address :=
System'To_Address (16#40011000#);
USART2_Base : constant System.Address :=
System'To_Address (16#40004400#);
USART3_Base : constant System.Address :=
System'To_Address (16#40004800#);
DAC_Base : constant System.Address :=
System'To_Address (16#40007400#);
PWR_Base : constant System.Address :=
System'To_Address (16#40007000#);
I2C3_Base : constant System.Address :=
System'To_Address (16#40005C00#);
I2C2_Base : constant System.Address :=
System'To_Address (16#40005800#);
I2C1_Base : constant System.Address :=
System'To_Address (16#40005400#);
IWDG_Base : constant System.Address :=
System'To_Address (16#40003000#);
WWDG_Base : constant System.Address :=
System'To_Address (16#40002C00#);
RTC_Base : constant System.Address :=
System'To_Address (16#40002800#);
UART4_Base : constant System.Address :=
System'To_Address (16#40004C00#);
UART5_Base : constant System.Address :=
System'To_Address (16#40005000#);
C_ADC_Base : constant System.Address :=
System'To_Address (16#40012300#);
TIM1_Base : constant System.Address :=
System'To_Address (16#40010000#);
TIM8_Base : constant System.Address :=
System'To_Address (16#40010400#);
TIM2_Base : constant System.Address :=
System'To_Address (16#40000000#);
TIM3_Base : constant System.Address :=
System'To_Address (16#40000400#);
TIM4_Base : constant System.Address :=
System'To_Address (16#40000800#);
TIM5_Base : constant System.Address :=
System'To_Address (16#40000C00#);
TIM9_Base : constant System.Address :=
System'To_Address (16#40014000#);
TIM12_Base : constant System.Address :=
System'To_Address (16#40001800#);
TIM10_Base : constant System.Address :=
System'To_Address (16#40014400#);
TIM13_Base : constant System.Address :=
System'To_Address (16#40001C00#);
TIM14_Base : constant System.Address :=
System'To_Address (16#40002000#);
TIM11_Base : constant System.Address :=
System'To_Address (16#40014800#);
TIM6_Base : constant System.Address :=
System'To_Address (16#40001000#);
TIM7_Base : constant System.Address :=
System'To_Address (16#40001400#);
Ethernet_MAC_Base : constant System.Address :=
System'To_Address (16#40028000#);
Ethernet_MMC_Base : constant System.Address :=
System'To_Address (16#40028100#);
Ethernet_PTP_Base : constant System.Address :=
System'To_Address (16#40028700#);
Ethernet_DMA_Base : constant System.Address :=
System'To_Address (16#40029000#);
CRC_Base : constant System.Address :=
System'To_Address (16#40023000#);
OTG_FS_GLOBAL_Base : constant System.Address :=
System'To_Address (16#50000000#);
OTG_FS_HOST_Base : constant System.Address :=
System'To_Address (16#50000400#);
OTG_FS_DEVICE_Base : constant System.Address :=
System'To_Address (16#50000800#);
OTG_FS_PWRCLK_Base : constant System.Address :=
System'To_Address (16#50000E00#);
CAN1_Base : constant System.Address :=
System'To_Address (16#40006400#);
CAN2_Base : constant System.Address :=
System'To_Address (16#40006800#);
FLASH_Base : constant System.Address :=
System'To_Address (16#40023C00#);
EXTI_Base : constant System.Address :=
System'To_Address (16#40013C00#);
OTG_HS_GLOBAL_Base : constant System.Address :=
System'To_Address (16#40040000#);
OTG_HS_HOST_Base : constant System.Address :=
System'To_Address (16#40040400#);
OTG_HS_DEVICE_Base : constant System.Address :=
System'To_Address (16#40040800#);
OTG_HS_PWRCLK_Base : constant System.Address :=
System'To_Address (16#40040E00#);
NVIC_Base : constant System.Address :=
System'To_Address (16#E000E000#);
end STM32_SVD;
|
stcarrez/dynamo | Ada | 12,581 | ads | ------------------------------------------------------------------------------
-- --
-- ASIS-for-GNAT INTERFACE COMPONENTS --
-- --
-- A S I S . C L A U S E S --
-- --
-- S p e c --
-- --
-- Copyright (C) 2006-2012, Free Software Foundation, Inc. --
-- --
-- This specification is adapted from the Ada Semantic Interface --
-- Specification Standard (ISO/IEC 15291) for use with GNAT. In accordance --
-- with the copyright of that document, you can freely copy and modify this --
-- specification, provided that if you redistribute a modified version, any --
-- changes that you have made are clearly indicated. --
-- --
-- This specification also contains suggestions and discussion items --
-- related to revising the ASIS Standard according to the changes proposed --
-- for the new revision of the Ada standard. The copyright notice above, --
-- and the license provisions that follow apply solely to these suggestions --
-- and discussion items that are separated by the corresponding comment --
-- sentinels --
-- --
-- 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). --
-- --
------------------------------------------------------------------------------
------------------------------------------------------------------------------
-- 19 package Asis.Clauses
-- Suggestions related to changing this specification to accept new Ada
-- features as defined in incoming revision of the Ada Standard (ISO 8652)
-- are marked by following comment sentinels:
--
-- --|A2005 start
-- ... the suggestion goes here ...
-- --|A2005 end
--
-- and the discussion items are marked by the comment sentinels of teh form:
--
-- --|D2005 start
-- ... the discussion item goes here ...
-- --|D2005 end
------------------------------------------------------------------------------
------------------------------------------------------------------------------
package Asis.Clauses is
------------------------------------------------------------------------------
------------------------------------------------------------------------------
-- Asis.Clauses
--
-- This package encapsulates a set of queries that operate on A_Clause
-- elements.
--
-- --|ER---------------------------------------------------------------------
-- --|ER A_Use_Package_Clause - 8.4
-- --|ER A_Use_Type_Clause - 8.4
-- --|ER A_Use_All_Type_Clause - 8.4 -- Ada 2012
-- --|ER A_With_Clause - 10.1.2
-- --|CR
-- --|CR Child elements returned by:
-- --|CR function Clause_Names
-- --|CR
------------------------------------------------------------------------------
------------------------------------------------------------------------------
-- 19.1 function Clause_Names
------------------------------------------------------------------------------
function Clause_Names (Clause : Asis.Element) return Asis.Name_List;
------------------------------------------------------------------------------
-- Clause - Specifies the with_clause or use_clause to query
--
-- Returns a list of the names that appear in the given clause.
-- The names in the list should be in their order of appearance in the
-- original clauses from the compilation text.
--
-- Results of this query may vary across ASIS implementations. Some
-- implementations normalize all clauses containing multiple names
-- into an equivalent sequence of corresponding single clauses.
-- Similarly, an implementation may keep a name only once even though that
-- name can appear more than once in a clause.
--
-- Appropriate Element_Kinds:
-- A_Use_Package_Clause
-- A_Use_Type_Clause
-- A_Use_All_Type_Clause -- Ada 2012
-- A_With_Clause
--
-- Returns Expression_Kinds:
-- An_Identifier
-- A_Selected_Component
-- An_Attribute_Reference
--
-- --|ER---------------------------------------------------------------------
-- --|ER A_Representation_Clause - 13.1
-- --|ER---------------------------------------------------------------------
-- --|ER An_Attribute_Definition_Clause - 13.3
-- --|ER An_Enumeration_Representation_Clause - 13.4
-- --|ER An_At_Clause - J.7
-- --|CR
-- --|CR Child elements returned by:
-- --|CR function Representation_Clause_Name
-- --|CR function Representation_Clause_Expression
--
------------------------------------------------------------------------------
-- 19.2 function Representation_Clause_Name
------------------------------------------------------------------------------
function Representation_Clause_Name
(Clause : Asis.Clause)
return Asis.Name;
------------------------------------------------------------------------------
-- Clause - Specifies the representation_clause to query
--
-- Returns the direct_name expression following the reserved word "for".
--
-- |D2005 start
-- But A_Component_Clause does not have the reserved word "for"! The wording
-- needs revising!
-- |D2005 end
--
-- Appropriate Clause_Kinds:
-- A_Representation_Clause
-- A_Component_Clause
--
-- Returns Expression_Kinds:
-- An_Identifier
-- An_Attribute_Reference
--
------------------------------------------------------------------------------
-- 19.3 function Representation_Clause_Expression
------------------------------------------------------------------------------
function Representation_Clause_Expression
(Clause : Asis.Representation_Clause)
return Asis.Expression;
------------------------------------------------------------------------------
-- Clause - Specifies the representation_clause to query
--
-- Returns the expression following the reserved word "use" or the reserved
-- words "use at".
--
-- Appropriate Representation_Clause_Kinds:
-- An_Attribute_Definition_Clause
-- An_Enumeration_Representation_Clause
-- An_At_Clause
--
-- Returns Element_Kinds:
-- An_Expression
--
-- --|ER---------------------------------------------------------------------
-- --|ER A_Record_Representation_Clause - 13.5.1
-- --|CR
-- --|CR Child elements returned by:
-- --|CR function Representation_Clause_Name
-- --|CR function Mod_Clause_Expression
-- --|CR function Component_Clauses
--
------------------------------------------------------------------------------
-- 19.4 function Mod_Clause_Expression
------------------------------------------------------------------------------
function Mod_Clause_Expression
(Clause : Asis.Representation_Clause)
return Asis.Expression;
------------------------------------------------------------------------------
-- Clause - Specifies the record representation clause to query
--
-- Returns the static_expression appearing after the reserved words "at mod".
--
-- Returns a Nil_Element if a mod_clause is not present.
--
-- Appropriate Representation_Clause_Kinds:
-- A_Record_Representation_Clause
--
-- Returns Element_Kinds:
-- Not_An_Element
-- An_Expression
--
------------------------------------------------------------------------------
-- 19.5 function Component_Clauses
------------------------------------------------------------------------------
function Component_Clauses
(Clause : Asis.Representation_Clause;
Include_Pragmas : Boolean := False)
return Asis.Component_Clause_List;
------------------------------------------------------------------------------
-- Clause - Specifies the record representation clause to query
-- Include_Pragmas - Specifies whether pragmas are to be returned
--
-- Returns the component_clause and pragma elements from the
-- record_representation_clause, in their order of appearance.
--
-- Returns a Nil_Element_List if the record_representation_clause has no
-- component_clause or pragma elements.
--
-- Appropriate Representation_Clause_Kinds:
-- A_Record_Representation_Clause
--
-- Returns Element_Kinds:
-- A_Clause
-- A_Pragma
--
-- Returns Clause_Kinds:
-- A_Component_Clause
--
-- --|ER---------------------------------------------------------------------
-- --|ER A_Component_Clause - 13.5.1
-- --|CR
-- --|CR Child elements returned by:
-- --|CR function Representation_Clause_Name
-- --|CR function Component_Clause_Position
-- --|CR function Component_Clause_Range
--
------------------------------------------------------------------------------
-- 19.6 function Component_Clause_Position
------------------------------------------------------------------------------
function Component_Clause_Position
(Clause : Asis.Component_Clause)
return Asis.Expression;
------------------------------------------------------------------------------
-- Clause - Specifies the component_clause to query
--
-- Returns the position expression for the component_clause.
--
-- Appropriate Clause_Kinds:
-- A_Component_Clause
--
-- Returns Element_Kinds:
-- An_Expression
--
------------------------------------------------------------------------------
-- 19.7 function Component_Clause_Range
------------------------------------------------------------------------------
function Component_Clause_Range
(Clause : Asis.Component_Clause)
return Asis.Discrete_Range;
------------------------------------------------------------------------------
-- Clause - Specifies the component_clause to query
--
-- Returns the first_bit .. last_bit range for the component_clause.
--
-- Appropriate Clause_Kinds:
-- A_Component_Clause
--
-- Returns Discrete_Range_Kinds:
-- A_Discrete_Simple_Expression_Range
--
------------------------------------------------------------------------------
end Asis.Clauses;
|
ekoeppen/STM32_Generic_Ada_Drivers | Ada | 3,902 | ads | -- This spec has been automatically generated from STM32F0xx.svd
pragma Restrictions (No_Elaboration_Code);
pragma Ada_2012;
pragma Style_Checks (Off);
with System;
package STM32_SVD.IWDG is
pragma Preelaborate;
---------------
-- Registers --
---------------
subtype KR_KEY_Field is STM32_SVD.UInt16;
-- Key register
type KR_Register is record
-- Write-only. Key value
KEY : KR_KEY_Field := 16#0#;
-- unspecified
Reserved_16_31 : STM32_SVD.UInt16 := 16#0#;
end record
with Volatile_Full_Access, Size => 32,
Bit_Order => System.Low_Order_First;
for KR_Register use record
KEY at 0 range 0 .. 15;
Reserved_16_31 at 0 range 16 .. 31;
end record;
subtype PR_PR_Field is STM32_SVD.UInt3;
-- Prescaler register
type PR_Register is record
-- Prescaler divider
PR : PR_PR_Field := 16#0#;
-- unspecified
Reserved_3_31 : STM32_SVD.UInt29 := 16#0#;
end record
with Volatile_Full_Access, Size => 32,
Bit_Order => System.Low_Order_First;
for PR_Register use record
PR at 0 range 0 .. 2;
Reserved_3_31 at 0 range 3 .. 31;
end record;
subtype RLR_RL_Field is STM32_SVD.UInt12;
-- Reload register
type RLR_Register is record
-- Watchdog counter reload value
RL : RLR_RL_Field := 16#FFF#;
-- unspecified
Reserved_12_31 : STM32_SVD.UInt20 := 16#0#;
end record
with Volatile_Full_Access, Size => 32,
Bit_Order => System.Low_Order_First;
for RLR_Register use record
RL at 0 range 0 .. 11;
Reserved_12_31 at 0 range 12 .. 31;
end record;
subtype SR_PVU_Field is STM32_SVD.Bit;
subtype SR_RVU_Field is STM32_SVD.Bit;
subtype SR_WVU_Field is STM32_SVD.Bit;
-- Status register
type SR_Register is record
-- Read-only. Watchdog prescaler value update
PVU : SR_PVU_Field;
-- Read-only. Watchdog counter reload value update
RVU : SR_RVU_Field;
-- Read-only. Watchdog counter window value update
WVU : SR_WVU_Field;
-- unspecified
Reserved_3_31 : STM32_SVD.UInt29;
end record
with Volatile_Full_Access, Size => 32,
Bit_Order => System.Low_Order_First;
for SR_Register use record
PVU at 0 range 0 .. 0;
RVU at 0 range 1 .. 1;
WVU at 0 range 2 .. 2;
Reserved_3_31 at 0 range 3 .. 31;
end record;
subtype WINR_WIN_Field is STM32_SVD.UInt12;
-- Window register
type WINR_Register is record
-- Watchdog counter window value
WIN : WINR_WIN_Field := 16#FFF#;
-- unspecified
Reserved_12_31 : STM32_SVD.UInt20 := 16#0#;
end record
with Volatile_Full_Access, Size => 32,
Bit_Order => System.Low_Order_First;
for WINR_Register use record
WIN at 0 range 0 .. 11;
Reserved_12_31 at 0 range 12 .. 31;
end record;
-----------------
-- Peripherals --
-----------------
-- Independent watchdog
type IWDG_Peripheral is record
-- Key register
KR : aliased KR_Register;
-- Prescaler register
PR : aliased PR_Register;
-- Reload register
RLR : aliased RLR_Register;
-- Status register
SR : aliased SR_Register;
-- Window register
WINR : aliased WINR_Register;
end record
with Volatile;
for IWDG_Peripheral use record
KR at 16#0# range 0 .. 31;
PR at 16#4# range 0 .. 31;
RLR at 16#8# range 0 .. 31;
SR at 16#C# range 0 .. 31;
WINR at 16#10# range 0 .. 31;
end record;
-- Independent watchdog
IWDG_Periph : aliased IWDG_Peripheral
with Import, Address => System'To_Address (16#40003000#);
end STM32_SVD.IWDG;
|
Rodeo-McCabe/orka | Ada | 1,480 | ads | -- SPDX-License-Identifier: Apache-2.0
--
-- Copyright (c) 2020 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 Orka.Transforms.Singles.Vectors;
with Orka.Types;
package Orka.Features.Terrain.Spheres is
pragma Preelaborate;
use all type GL.Types.Single;
function Plane_To_Sphere
(Vertex : Orka.Transforms.Singles.Vectors.Vector4;
Parameters : Orka.Features.Terrain.Spheroid_Parameters)
return Orka.Transforms.Singles.Vectors.Vector4;
function Get_Sphere_Visibilities
(Parameters : Spheroid_Parameters;
Front, Back, World, View : Orka.Types.Singles.Matrix4)
return GL.Types.Single_Array
with Post => Get_Sphere_Visibilities'Result'Length = 8;
function Get_Visible_Tiles
(Visibilities : GL.Types.Single_Array) return Visible_Tile_Array
with Pre => Visibilities'Length = 8,
Post => Get_Visible_Tiles'Result'Length = 6;
end Orka.Features.Terrain.Spheres;
|
strenkml/EE368 | Ada | 7,904 | adb |
with Device;
with Memory.Split; use Memory.Split;
with Memory.Join; use Memory.Join;
with Memory.Transform; use Memory.Transform;
package body Memory.Register is
-- Locate the position at which to insert a register and insert it.
function Insert_Register(mem : Memory_Pointer) return Boolean is
max_path : constant Natural := Device.Get_Max_Path;
begin
if Get_Path_Length(mem.all) <= max_path then
return False;
end if;
if mem.all in Split_Type'Class then
declare
sp : constant Split_Pointer := Split_Pointer(mem);
np : constant Memory_Pointer := Get_Memory(sp.all);
b0 : constant Memory_Pointer := Get_Bank(sp.all, 0);
b1 : constant Memory_Pointer := Get_Bank(sp.all, 1);
begin
if Insert_Register(np) then
return True;
end if;
if Insert_Register(b0) then
return True;
end if;
if Insert_Register(b1) then
return True;
end if;
-- Insert two registers: one for each bank.
Set_Bank(sp.all, 0, Create_Register(b0));
Set_Bank(sp.all, 1, Create_Register(b1));
return True;
end;
elsif mem.all in Join_Type'Class then
return False;
elsif mem.all in Transform_Type'Class then
declare
tp : constant Transform_Pointer := Transform_Pointer(mem);
np : constant Memory_Pointer := Get_Memory(tp.all);
bp : constant Memory_Pointer := Get_Bank(tp.all);
begin
if Insert_Register(np) then
return True;
end if;
if bp /= null and then Insert_Register(bp) then
return True;
end if;
if bp /= null then
Set_Bank(tp.all, Create_Register(bp));
else
Set_Memory(tp.all, Create_Register(np));
end if;
return True;
end;
else
declare
cp : constant Container_Pointer := Container_Pointer(mem);
np : constant Memory_Pointer := Get_Memory(cp.all);
begin
if Insert_Register(np) then
return True;
end if;
Set_Memory(cp.all, Create_Register(np));
return True;
end;
end if;
end Insert_Register;
procedure Insert_Registers(mem : access Memory_Type'Class) is
begin
-- Continue inserting registers until we either no longer exceed
-- the max path length or we are unable to reduce the path length.
loop
exit when not Insert_Register(Memory_Pointer(mem));
end loop;
end Insert_Registers;
function Remove_Registers(mem : Memory_Pointer) return Memory_Pointer is
begin
if mem = null then
return null;
elsif mem.all in Register_Type'Class then
declare
rp : Register_Pointer := Register_Pointer(mem);
np : constant Memory_Pointer := Get_Memory(rp.all);
begin
Set_Memory(rp.all, null);
Destroy(Memory_Pointer(rp));
return Remove_Registers(np);
end;
elsif mem.all in Split_Type'Class then
declare
sp : constant Split_Pointer := Split_Pointer(mem);
b0 : constant Memory_Pointer := Get_Bank(sp.all, 0);
b1 : constant Memory_Pointer := Get_Bank(sp.all, 1);
np : constant Memory_Pointer := Get_Memory(sp.all);
begin
Set_Bank(sp.all, 0, Remove_Registers(b0));
Set_Bank(sp.all, 1, Remove_Registers(b1));
Set_Memory(sp.all, Remove_Registers(np));
return mem;
end;
elsif mem.all in Transform_Type'Class then
declare
tp : constant Transform_Pointer := Transform_Pointer(mem);
bp : constant Memory_Pointer := Get_Bank(tp.all);
np : constant Memory_Pointer := Get_Memory(tp.all);
begin
Set_Bank(tp.all, Remove_Registers(bp));
Set_Memory(tp.all, Remove_Registers(np));
return mem;
end;
elsif mem.all in Container_Type'Class then
declare
cp : constant Container_Pointer := Container_Pointer(mem);
np : constant Memory_Pointer := Get_Memory(cp.all);
begin
Set_Memory(cp.all, Remove_Registers(np));
return mem;
end;
else
return mem;
end if;
end Remove_Registers;
function Create_Register(mem : access Memory_Type'Class)
return Register_Pointer is
result : constant Register_Pointer := new Register_Type;
begin
Set_Memory(result.all, mem);
return result;
end Create_Register;
function Clone(mem : Register_Type) return Memory_Pointer is
begin
return new Register_Type'(mem);
end Clone;
procedure Permute(mem : in out Register_Type;
generator : in Distribution_Type;
max_cost : in Cost_Type) is
begin
null;
end Permute;
procedure Read(mem : in out Register_Type;
address : in Address_Type;
size : in Positive) is
begin
Advance(mem, 1);
Read(Container_Type(mem), address, size);
end Read;
procedure Write(mem : in out Register_Type;
address : in Address_Type;
size : in Positive) is
begin
Advance(mem, 1);
Write(Container_Type(mem), address, size);
end Write;
function Get_Path_Length(mem : Register_Type) return Natural is
begin
return 0;
end Get_Path_Length;
function To_String(mem : Register_Type) return Unbounded_String is
result : Unbounded_String;
begin
Append(result, "(register ");
Append(result, "(memory ");
Append(result, To_String(Container_Type(mem)));
Append(result, ")");
Append(result, ")");
return result;
end To_String;
procedure Generate(mem : in Register_Type;
sigs : in out Unbounded_String;
code : in out Unbounded_String) is
other : constant Memory_Pointer := Get_Memory(mem);
wbits : constant Natural := 8 * Get_Word_Size(mem);
name : constant String := "m" & To_String(Get_ID(mem));
oname : constant String := "m" & To_String(Get_ID(other.all));
begin
Generate(other.all, sigs, code);
Declare_Signals(sigs, name, wbits);
Line(code, name & "_inst : entity work.reg");
Line(code, " generic map (");
Line(code, " ADDR_WIDTH => ADDR_WIDTH,");
Line(code, " WORD_WIDTH => " & To_String(wbits));
Line(code, " )");
Line(code, " port map (");
Line(code, " clk => clk,");
Line(code, " rst => rst,");
Line(code, " addr => " & name & "_addr,");
Line(code, " din => " & name & "_din,");
Line(code, " dout => " & name & "_dout,");
Line(code, " re => " & name & "_re,");
Line(code, " we => " & name & "_we,");
Line(code, " mask => " & name & "_mask,");
Line(code, " ready => " & name & "_ready,");
Line(code, " maddr => " & oname & "_addr,");
Line(code, " min => " & oname & "_dout,");
Line(code, " mout => " & oname & "_din,");
Line(code, " mre => " & oname & "_re,");
Line(code, " mwe => " & oname & "_we,");
Line(code, " mmask => " & oname & "_mask,");
Line(code, " mready => " & oname & "_ready");
Line(code, " );");
end Generate;
end Memory.Register;
|
reznikmm/matreshka | Ada | 4,607 | adb | ------------------------------------------------------------------------------
-- --
-- Matreshka Project --
-- --
-- Open Document Toolkit --
-- --
-- Runtime Library Component --
-- --
------------------------------------------------------------------------------
-- --
-- Copyright © 2014, Vadim Godunko <[email protected]> --
-- All rights reserved. --
-- --
-- Redistribution and use in source and binary forms, with or without --
-- modification, are permitted provided that the following conditions --
-- are met: --
-- --
-- * Redistributions of source code must retain the above copyright --
-- notice, this list of conditions and the following disclaimer. --
-- --
-- * Redistributions in binary form must reproduce the above copyright --
-- notice, this list of conditions and the following disclaimer in the --
-- documentation and/or other materials provided with the distribution. --
-- --
-- * Neither the name of the Vadim Godunko, IE nor the names of its --
-- contributors may be used to endorse or promote products derived from --
-- this software without specific prior written permission. --
-- --
-- THIS SOFTWARE IS PROVIDED BY THE COPYRIGHT HOLDERS AND CONTRIBUTORS --
-- "AS IS" AND ANY EXPRESS OR IMPLIED WARRANTIES, INCLUDING, BUT NOT --
-- LIMITED TO, THE IMPLIED WARRANTIES OF MERCHANTABILITY AND FITNESS FOR --
-- A PARTICULAR PURPOSE ARE DISCLAIMED. IN NO EVENT SHALL THE COPYRIGHT --
-- HOLDER OR CONTRIBUTORS BE LIABLE FOR ANY DIRECT, INDIRECT, INCIDENTAL, --
-- SPECIAL, EXEMPLARY, OR CONSEQUENTIAL DAMAGES (INCLUDING, BUT NOT LIMITED --
-- TO, PROCUREMENT OF SUBSTITUTE GOODS OR SERVICES; LOSS OF USE, DATA, OR --
-- PROFITS; OR BUSINESS INTERRUPTION) HOWEVER CAUSED AND ON ANY THEORY OF --
-- LIABILITY, WHETHER IN CONTRACT, STRICT LIABILITY, OR TORT (INCLUDING --
-- NEGLIGENCE OR OTHERWISE) ARISING IN ANY WAY OUT OF THE USE OF THIS --
-- SOFTWARE, EVEN IF ADVISED OF THE POSSIBILITY OF SUCH DAMAGE. --
-- --
------------------------------------------------------------------------------
-- $Revision$ $Date$
------------------------------------------------------------------------------
with Matreshka.DOM_Documents;
with Matreshka.ODF_String_Constants;
with ODF.DOM.Iterators;
with ODF.DOM.Visitors;
package body Matreshka.ODF_Text.Row_Number_Attributes is
------------
-- Create --
------------
overriding function Create
(Parameters : not null access Matreshka.DOM_Attributes.Attribute_L2_Parameters)
return Text_Row_Number_Attribute_Node is
begin
return Self : Text_Row_Number_Attribute_Node do
Matreshka.ODF_Text.Constructors.Initialize
(Self'Unchecked_Access,
Parameters.Document,
Matreshka.ODF_String_Constants.Text_Prefix);
end return;
end Create;
--------------------
-- Get_Local_Name --
--------------------
overriding function Get_Local_Name
(Self : not null access constant Text_Row_Number_Attribute_Node)
return League.Strings.Universal_String
is
pragma Unreferenced (Self);
begin
return Matreshka.ODF_String_Constants.Row_Number_Attribute;
end Get_Local_Name;
begin
Matreshka.DOM_Documents.Register_Attribute
(Matreshka.ODF_String_Constants.Text_URI,
Matreshka.ODF_String_Constants.Row_Number_Attribute,
Text_Row_Number_Attribute_Node'Tag);
end Matreshka.ODF_Text.Row_Number_Attributes;
|
burratoo/Acton | Ada | 3,836 | adb | ------------------------------------------------------------------------------------------
-- --
-- OAK PROCESSOR SUPPORT PACKAGE --
-- ATMEL AT91SAM7S --
-- --
-- OAK.PROCESSOR_SUPPORT_PACKAGE.INTERRUPTS --
-- --
-- Copyright (C) 2014-2021, Patrick Bernardi --
-- --
------------------------------------------------------------------------------------------
with Oak.Brokers.Protected_Objects; use Oak.Brokers.Protected_Objects;
with Atmel; use Atmel;
with Atmel.AT91SAM7S; use Atmel.AT91SAM7S;
with Atmel.AT91SAM7S.AIC; use Atmel.AT91SAM7S.AIC;
package body Oak.Processor_Support_Package.Interrupts is
procedure External_Interrupt_Handler (Interrupt_Id : External_Interrupt_Id)
is
ICRV : Peripheral_Bit_Field := (others => False);
begin
AIC_Vector_Table (Interrupt_Id).all;
ICRV (Interrupt_Id) := True;
Interrupt_Clear_Command_Register.Clear_Interrupt := ICRV;
End_Of_Interrupt_Command_Register := 1;
end External_Interrupt_Handler;
function Get_External_Interrupt_Id return External_Interrupt_Id is
A : Address with Unreferenced;
begin
A := Interrupt_Vector_Register;
return Interrupt_Status_Register.Current_Interrupt;
end Get_External_Interrupt_Id;
procedure Initialise_Interrupts is
begin
-- Need to turn on interrupts here?
null;
end Initialise_Interrupts;
procedure Complete_Interrupt_Initialisation is null;
procedure Attach_Handler (Interrupt : External_Interrupt_Id;
Handler : Parameterless_Handler;
Priority : Interrupt_Priority)
is
pragma Unreferenced (Priority);
IECV : Interrupt_Enable_No_Change_Field := (others => No_Change);
begin
-- All interrupts use the same priority since we cannot mask priorities
-- from software
AIC.Source_Mode_Register (Interrupt).Priority_Level := 1;
AIC_Vector_Table (Interrupt) := Handler;
IECV (Interrupt) := Enable;
Interrupt_Enable_Command_Register.Interrupt := IECV;
end Attach_Handler;
function Current_Interrupt_Priority return Any_Priority is
Interrupt_Id : constant External_Interrupt_Id :=
Interrupt_Status_Register.Current_Interrupt;
begin
-- On the AT91SAM7S there is only one interrupt priority level
-- available since we cannot mask the hardware interrupts based on
-- priority.
return
(if Source_Mode_Register (Interrupt_Id).Priority_Level > 0
then Interrupt_Priority'Last else Priority'Last);
end Current_Interrupt_Priority;
procedure Set_Hardware_Priority (P : Any_Priority) is null;
procedure Clear_Hardware_Priority is null;
function Handler_Protected_Object
(Interrupt : External_Interrupt_Id) return Protected_Id_With_No is
begin
return Protected_Object_From_Access
(Parameterless_Access (AIC_Vector_Table (Interrupt)));
end Handler_Protected_Object;
function Has_Outstanding_Interrupts (Above_Priority : Any_Priority)
return Boolean is
begin
return Core_Interrupt_Status_Register.NIRQ = Active
and Above_Priority = 0;
end Has_Outstanding_Interrupts;
end Oak.Processor_Support_Package.Interrupts;
|
Fabien-Chouteau/samd51-hal | Ada | 15,078 | ads | pragma Style_Checks (Off);
-- This spec has been automatically generated from ATSAMD51G19A.svd
pragma Restrictions (No_Elaboration_Code);
with HAL;
with System;
package SAM_SVD.ICM is
pragma Preelaborate;
---------------
-- Registers --
---------------
subtype ICM_CFG_BBC_Field is HAL.UInt4;
-- User SHA Algorithm
type CFG_UALGOSelect is
(-- SHA1 Algorithm
SHA1,
-- SHA256 Algorithm
SHA256,
-- SHA224 Algorithm
SHA224)
with Size => 3;
for CFG_UALGOSelect use
(SHA1 => 0,
SHA256 => 1,
SHA224 => 4);
subtype ICM_CFG_HAPROT_Field is HAL.UInt6;
subtype ICM_CFG_DAPROT_Field is HAL.UInt6;
-- Configuration
type ICM_CFG_Register is record
-- Write Back Disable
WBDIS : Boolean := False;
-- End of Monitoring Disable
EOMDIS : Boolean := False;
-- Secondary List Branching Disable
SLBDIS : Boolean := False;
-- unspecified
Reserved_3_3 : HAL.Bit := 16#0#;
-- Bus Burden Control
BBC : ICM_CFG_BBC_Field := 16#0#;
-- Automatic Switch To Compare Digest
ASCD : Boolean := False;
-- Dual Input Buffer
DUALBUFF : Boolean := False;
-- unspecified
Reserved_10_11 : HAL.UInt2 := 16#0#;
-- User Initial Hash Value
UIHASH : Boolean := False;
-- User SHA Algorithm
UALGO : CFG_UALGOSelect := SAM_SVD.ICM.SHA1;
-- Region Hash Area Protection
HAPROT : ICM_CFG_HAPROT_Field := 16#0#;
-- unspecified
Reserved_22_23 : HAL.UInt2 := 16#0#;
-- Region Descriptor Area Protection
DAPROT : ICM_CFG_DAPROT_Field := 16#0#;
-- unspecified
Reserved_30_31 : HAL.UInt2 := 16#0#;
end record
with Volatile_Full_Access, Object_Size => 32,
Bit_Order => System.Low_Order_First;
for ICM_CFG_Register use record
WBDIS at 0 range 0 .. 0;
EOMDIS at 0 range 1 .. 1;
SLBDIS at 0 range 2 .. 2;
Reserved_3_3 at 0 range 3 .. 3;
BBC at 0 range 4 .. 7;
ASCD at 0 range 8 .. 8;
DUALBUFF at 0 range 9 .. 9;
Reserved_10_11 at 0 range 10 .. 11;
UIHASH at 0 range 12 .. 12;
UALGO at 0 range 13 .. 15;
HAPROT at 0 range 16 .. 21;
Reserved_22_23 at 0 range 22 .. 23;
DAPROT at 0 range 24 .. 29;
Reserved_30_31 at 0 range 30 .. 31;
end record;
subtype ICM_CTRL_REHASH_Field is HAL.UInt4;
subtype ICM_CTRL_RMDIS_Field is HAL.UInt4;
subtype ICM_CTRL_RMEN_Field is HAL.UInt4;
-- Control
type ICM_CTRL_Register is record
-- Write-only. ICM Enable
ENABLE : Boolean := False;
-- Write-only. ICM Disable Register
DISABLE : Boolean := False;
-- Write-only. Software Reset
SWRST : Boolean := False;
-- unspecified
Reserved_3_3 : HAL.Bit := 16#0#;
-- Write-only. Recompute Internal Hash
REHASH : ICM_CTRL_REHASH_Field := 16#0#;
-- Write-only. Region Monitoring Disable
RMDIS : ICM_CTRL_RMDIS_Field := 16#0#;
-- Write-only. Region Monitoring Enable
RMEN : ICM_CTRL_RMEN_Field := 16#0#;
-- unspecified
Reserved_16_31 : HAL.UInt16 := 16#0#;
end record
with Volatile_Full_Access, Object_Size => 32,
Bit_Order => System.Low_Order_First;
for ICM_CTRL_Register use record
ENABLE at 0 range 0 .. 0;
DISABLE at 0 range 1 .. 1;
SWRST at 0 range 2 .. 2;
Reserved_3_3 at 0 range 3 .. 3;
REHASH at 0 range 4 .. 7;
RMDIS at 0 range 8 .. 11;
RMEN at 0 range 12 .. 15;
Reserved_16_31 at 0 range 16 .. 31;
end record;
subtype ICM_SR_RAWRMDIS_Field is HAL.UInt4;
subtype ICM_SR_RMDIS_Field is HAL.UInt4;
-- Status
type ICM_SR_Register is record
-- Read-only. ICM Controller Enable Register
ENABLE : Boolean;
-- unspecified
Reserved_1_7 : HAL.UInt7;
-- Read-only. RAW Region Monitoring Disabled Status
RAWRMDIS : ICM_SR_RAWRMDIS_Field;
-- Read-only. Region Monitoring Disabled Status
RMDIS : ICM_SR_RMDIS_Field;
-- unspecified
Reserved_16_31 : HAL.UInt16;
end record
with Volatile_Full_Access, Object_Size => 32,
Bit_Order => System.Low_Order_First;
for ICM_SR_Register use record
ENABLE at 0 range 0 .. 0;
Reserved_1_7 at 0 range 1 .. 7;
RAWRMDIS at 0 range 8 .. 11;
RMDIS at 0 range 12 .. 15;
Reserved_16_31 at 0 range 16 .. 31;
end record;
subtype ICM_IER_RHC_Field is HAL.UInt4;
subtype ICM_IER_RDM_Field is HAL.UInt4;
subtype ICM_IER_RBE_Field is HAL.UInt4;
subtype ICM_IER_RWC_Field is HAL.UInt4;
subtype ICM_IER_REC_Field is HAL.UInt4;
subtype ICM_IER_RSU_Field is HAL.UInt4;
-- Interrupt Enable
type ICM_IER_Register is record
-- Write-only. Region Hash Completed Interrupt Enable
RHC : ICM_IER_RHC_Field := 16#0#;
-- Write-only. Region Digest Mismatch Interrupt Enable
RDM : ICM_IER_RDM_Field := 16#0#;
-- Write-only. Region Bus Error Interrupt Enable
RBE : ICM_IER_RBE_Field := 16#0#;
-- Write-only. Region Wrap Condition detected Interrupt Enable
RWC : ICM_IER_RWC_Field := 16#0#;
-- Write-only. Region End bit Condition Detected Interrupt Enable
REC : ICM_IER_REC_Field := 16#0#;
-- Write-only. Region Status Updated Interrupt Disable
RSU : ICM_IER_RSU_Field := 16#0#;
-- Write-only. Undefined Register Access Detection Interrupt Enable
URAD : Boolean := False;
-- unspecified
Reserved_25_31 : HAL.UInt7 := 16#0#;
end record
with Volatile_Full_Access, Object_Size => 32,
Bit_Order => System.Low_Order_First;
for ICM_IER_Register use record
RHC at 0 range 0 .. 3;
RDM at 0 range 4 .. 7;
RBE at 0 range 8 .. 11;
RWC at 0 range 12 .. 15;
REC at 0 range 16 .. 19;
RSU at 0 range 20 .. 23;
URAD at 0 range 24 .. 24;
Reserved_25_31 at 0 range 25 .. 31;
end record;
subtype ICM_IDR_RHC_Field is HAL.UInt4;
subtype ICM_IDR_RDM_Field is HAL.UInt4;
subtype ICM_IDR_RBE_Field is HAL.UInt4;
subtype ICM_IDR_RWC_Field is HAL.UInt4;
subtype ICM_IDR_REC_Field is HAL.UInt4;
subtype ICM_IDR_RSU_Field is HAL.UInt4;
-- Interrupt Disable
type ICM_IDR_Register is record
-- Write-only. Region Hash Completed Interrupt Disable
RHC : ICM_IDR_RHC_Field := 16#0#;
-- Write-only. Region Digest Mismatch Interrupt Disable
RDM : ICM_IDR_RDM_Field := 16#0#;
-- Write-only. Region Bus Error Interrupt Disable
RBE : ICM_IDR_RBE_Field := 16#0#;
-- Write-only. Region Wrap Condition Detected Interrupt Disable
RWC : ICM_IDR_RWC_Field := 16#0#;
-- Write-only. Region End bit Condition detected Interrupt Disable
REC : ICM_IDR_REC_Field := 16#0#;
-- Write-only. Region Status Updated Interrupt Disable
RSU : ICM_IDR_RSU_Field := 16#0#;
-- Write-only. Undefined Register Access Detection Interrupt Disable
URAD : Boolean := False;
-- unspecified
Reserved_25_31 : HAL.UInt7 := 16#0#;
end record
with Volatile_Full_Access, Object_Size => 32,
Bit_Order => System.Low_Order_First;
for ICM_IDR_Register use record
RHC at 0 range 0 .. 3;
RDM at 0 range 4 .. 7;
RBE at 0 range 8 .. 11;
RWC at 0 range 12 .. 15;
REC at 0 range 16 .. 19;
RSU at 0 range 20 .. 23;
URAD at 0 range 24 .. 24;
Reserved_25_31 at 0 range 25 .. 31;
end record;
subtype ICM_IMR_RHC_Field is HAL.UInt4;
subtype ICM_IMR_RDM_Field is HAL.UInt4;
subtype ICM_IMR_RBE_Field is HAL.UInt4;
subtype ICM_IMR_RWC_Field is HAL.UInt4;
subtype ICM_IMR_REC_Field is HAL.UInt4;
subtype ICM_IMR_RSU_Field is HAL.UInt4;
-- Interrupt Mask
type ICM_IMR_Register is record
-- Read-only. Region Hash Completed Interrupt Mask
RHC : ICM_IMR_RHC_Field;
-- Read-only. Region Digest Mismatch Interrupt Mask
RDM : ICM_IMR_RDM_Field;
-- Read-only. Region Bus Error Interrupt Mask
RBE : ICM_IMR_RBE_Field;
-- Read-only. Region Wrap Condition Detected Interrupt Mask
RWC : ICM_IMR_RWC_Field;
-- Read-only. Region End bit Condition Detected Interrupt Mask
REC : ICM_IMR_REC_Field;
-- Read-only. Region Status Updated Interrupt Mask
RSU : ICM_IMR_RSU_Field;
-- Read-only. Undefined Register Access Detection Interrupt Mask
URAD : Boolean;
-- unspecified
Reserved_25_31 : HAL.UInt7;
end record
with Volatile_Full_Access, Object_Size => 32,
Bit_Order => System.Low_Order_First;
for ICM_IMR_Register use record
RHC at 0 range 0 .. 3;
RDM at 0 range 4 .. 7;
RBE at 0 range 8 .. 11;
RWC at 0 range 12 .. 15;
REC at 0 range 16 .. 19;
RSU at 0 range 20 .. 23;
URAD at 0 range 24 .. 24;
Reserved_25_31 at 0 range 25 .. 31;
end record;
subtype ICM_ISR_RHC_Field is HAL.UInt4;
subtype ICM_ISR_RDM_Field is HAL.UInt4;
subtype ICM_ISR_RBE_Field is HAL.UInt4;
subtype ICM_ISR_RWC_Field is HAL.UInt4;
subtype ICM_ISR_REC_Field is HAL.UInt4;
subtype ICM_ISR_RSU_Field is HAL.UInt4;
-- Interrupt Status
type ICM_ISR_Register is record
-- Read-only. Region Hash Completed
RHC : ICM_ISR_RHC_Field;
-- Read-only. Region Digest Mismatch
RDM : ICM_ISR_RDM_Field;
-- Read-only. Region Bus Error
RBE : ICM_ISR_RBE_Field;
-- Read-only. Region Wrap Condition Detected
RWC : ICM_ISR_RWC_Field;
-- Read-only. Region End bit Condition Detected
REC : ICM_ISR_REC_Field;
-- Read-only. Region Status Updated Detected
RSU : ICM_ISR_RSU_Field;
-- Read-only. Undefined Register Access Detection Status
URAD : Boolean;
-- unspecified
Reserved_25_31 : HAL.UInt7;
end record
with Volatile_Full_Access, Object_Size => 32,
Bit_Order => System.Low_Order_First;
for ICM_ISR_Register use record
RHC at 0 range 0 .. 3;
RDM at 0 range 4 .. 7;
RBE at 0 range 8 .. 11;
RWC at 0 range 12 .. 15;
REC at 0 range 16 .. 19;
RSU at 0 range 20 .. 23;
URAD at 0 range 24 .. 24;
Reserved_25_31 at 0 range 25 .. 31;
end record;
-- Undefined Register Access Trace
type UASR_URATSelect is
(-- Unspecified structure member set to one detected when the descriptor is
-- loaded
UNSPEC_STRUCT_MEMBER,
-- CFG modified during active monitoring
CFG_MODIFIED,
-- DSCR modified during active monitoring
DSCR_MODIFIED,
-- HASH modified during active monitoring
HASH_MODIFIED,
-- Write-only register read access
READ_ACCESS)
with Size => 3;
for UASR_URATSelect use
(UNSPEC_STRUCT_MEMBER => 0,
CFG_MODIFIED => 1,
DSCR_MODIFIED => 2,
HASH_MODIFIED => 3,
READ_ACCESS => 4);
-- Undefined Access Status
type ICM_UASR_Register is record
-- Read-only. Undefined Register Access Trace
URAT : UASR_URATSelect;
-- unspecified
Reserved_3_31 : HAL.UInt29;
end record
with Volatile_Full_Access, Object_Size => 32,
Bit_Order => System.Low_Order_First;
for ICM_UASR_Register use record
URAT at 0 range 0 .. 2;
Reserved_3_31 at 0 range 3 .. 31;
end record;
subtype ICM_DSCR_DASA_Field is HAL.UInt26;
-- Region Descriptor Area Start Address
type ICM_DSCR_Register is record
-- unspecified
Reserved_0_5 : HAL.UInt6 := 16#0#;
-- Descriptor Area Start Address
DASA : ICM_DSCR_DASA_Field := 16#0#;
end record
with Volatile_Full_Access, Object_Size => 32,
Bit_Order => System.Low_Order_First;
for ICM_DSCR_Register use record
Reserved_0_5 at 0 range 0 .. 5;
DASA at 0 range 6 .. 31;
end record;
subtype ICM_HASH_HASA_Field is HAL.UInt25;
-- Region Hash Area Start Address
type ICM_HASH_Register is record
-- unspecified
Reserved_0_6 : HAL.UInt7 := 16#0#;
-- Hash Area Start Address
HASA : ICM_HASH_HASA_Field := 16#0#;
end record
with Volatile_Full_Access, Object_Size => 32,
Bit_Order => System.Low_Order_First;
for ICM_HASH_Register use record
Reserved_0_6 at 0 range 0 .. 6;
HASA at 0 range 7 .. 31;
end record;
-- User Initial Hash Value n
-- User Initial Hash Value n
type ICM_UIHVAL_Registers is array (0 .. 7) of HAL.UInt32;
-----------------
-- Peripherals --
-----------------
-- Integrity Check Monitor
type ICM_Peripheral is record
-- Configuration
CFG : aliased ICM_CFG_Register;
-- Control
CTRL : aliased ICM_CTRL_Register;
-- Status
SR : aliased ICM_SR_Register;
-- Interrupt Enable
IER : aliased ICM_IER_Register;
-- Interrupt Disable
IDR : aliased ICM_IDR_Register;
-- Interrupt Mask
IMR : aliased ICM_IMR_Register;
-- Interrupt Status
ISR : aliased ICM_ISR_Register;
-- Undefined Access Status
UASR : aliased ICM_UASR_Register;
-- Region Descriptor Area Start Address
DSCR : aliased ICM_DSCR_Register;
-- Region Hash Area Start Address
HASH : aliased ICM_HASH_Register;
-- User Initial Hash Value n
UIHVAL : aliased ICM_UIHVAL_Registers;
end record
with Volatile;
for ICM_Peripheral use record
CFG at 16#0# range 0 .. 31;
CTRL at 16#4# range 0 .. 31;
SR at 16#8# range 0 .. 31;
IER at 16#10# range 0 .. 31;
IDR at 16#14# range 0 .. 31;
IMR at 16#18# range 0 .. 31;
ISR at 16#1C# range 0 .. 31;
UASR at 16#20# range 0 .. 31;
DSCR at 16#30# range 0 .. 31;
HASH at 16#34# range 0 .. 31;
UIHVAL at 16#38# range 0 .. 255;
end record;
-- Integrity Check Monitor
ICM_Periph : aliased ICM_Peripheral
with Import, Address => ICM_Base;
end SAM_SVD.ICM;
|
Fabien-Chouteau/GESTE | Ada | 145,759 | ads | package GESTE_Fonts.FreeMonoOblique24pt7b is
Font : constant Bitmap_Font_Ref;
private
FreeMonoOblique24pt7bBitmaps : 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#00#, 16#00#, 16#18#, 16#00#, 16#00#,
16#00#, 16#3C#, 16#00#, 16#00#, 16#00#, 16#3C#, 16#00#, 16#00#, 16#00#,
16#38#, 16#00#, 16#00#, 16#00#, 16#38#, 16#00#, 16#00#, 16#00#, 16#78#,
16#00#, 16#00#, 16#00#, 16#70#, 16#00#, 16#00#, 16#00#, 16#70#, 16#00#,
16#00#, 16#00#, 16#70#, 16#00#, 16#00#, 16#00#, 16#70#, 16#00#, 16#00#,
16#00#, 16#60#, 16#00#, 16#00#, 16#00#, 16#E0#, 16#00#, 16#00#, 16#00#,
16#E0#, 16#00#, 16#00#, 16#00#, 16#E0#, 16#00#, 16#00#, 16#00#, 16#C0#,
16#00#, 16#00#, 16#00#, 16#C0#, 16#00#, 16#00#, 16#00#, 16#C0#, 16#00#,
16#00#, 16#00#, 16#80#, 16#00#, 16#00#, 16#01#, 16#80#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#07#, 16#80#, 16#00#,
16#00#, 16#0F#, 16#80#, 16#00#, 16#00#, 16#0F#, 16#80#, 16#00#, 16#00#,
16#0F#, 16#80#, 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#1F#, 16#8F#, 16#C0#, 16#00#, 16#1F#,
16#8F#, 16#C0#, 16#00#, 16#1F#, 16#0F#, 16#80#, 16#00#, 16#1F#, 16#0F#,
16#80#, 16#00#, 16#1F#, 16#0F#, 16#80#, 16#00#, 16#1E#, 16#0F#, 16#00#,
16#00#, 16#1E#, 16#0F#, 16#00#, 16#00#, 16#1E#, 16#0F#, 16#00#, 16#00#,
16#3C#, 16#1E#, 16#00#, 16#00#, 16#3C#, 16#1E#, 16#00#, 16#00#, 16#3C#,
16#1E#, 16#00#, 16#00#, 16#38#, 16#1C#, 16#00#, 16#00#, 16#38#, 16#1C#,
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#60#, 16#C0#, 16#00#, 16#00#, 16#61#, 16#80#, 16#00#, 16#00#, 16#61#,
16#80#, 16#00#, 16#00#, 16#41#, 16#80#, 16#00#, 16#00#, 16#C3#, 16#00#,
16#00#, 16#00#, 16#C3#, 16#00#, 16#00#, 16#00#, 16#C3#, 16#00#, 16#00#,
16#01#, 16#82#, 16#00#, 16#00#, 16#01#, 16#86#, 16#00#, 16#00#, 16#01#,
16#86#, 16#00#, 16#00#, 16#03#, 16#06#, 16#00#, 16#00#, 16#7F#, 16#FF#,
16#F0#, 16#00#, 16#7F#, 16#FF#, 16#E0#, 16#00#, 16#03#, 16#0C#, 16#00#,
16#00#, 16#06#, 16#08#, 16#00#, 16#00#, 16#06#, 16#18#, 16#00#, 16#00#,
16#06#, 16#18#, 16#00#, 16#00#, 16#04#, 16#18#, 16#00#, 16#00#, 16#0C#,
16#30#, 16#00#, 16#01#, 16#FF#, 16#FF#, 16#80#, 16#03#, 16#FF#, 16#FF#,
16#80#, 16#00#, 16#18#, 16#30#, 16#00#, 16#00#, 16#18#, 16#60#, 16#00#,
16#00#, 16#18#, 16#60#, 16#00#, 16#00#, 16#18#, 16#60#, 16#00#, 16#00#,
16#30#, 16#C0#, 16#00#, 16#00#, 16#30#, 16#C0#, 16#00#, 16#00#, 16#30#,
16#C0#, 16#00#, 16#00#, 16#60#, 16#C0#, 16#00#, 16#00#, 16#61#, 16#80#,
16#00#, 16#00#, 16#61#, 16#80#, 16#00#, 16#00#, 16#61#, 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#18#,
16#00#, 16#00#, 16#00#, 16#18#, 16#00#, 16#00#, 16#00#, 16#18#, 16#00#,
16#00#, 16#00#, 16#7E#, 16#00#, 16#00#, 16#01#, 16#FF#, 16#A0#, 16#00#,
16#07#, 16#83#, 16#E0#, 16#00#, 16#0E#, 16#00#, 16#E0#, 16#00#, 16#0C#,
16#00#, 16#60#, 16#00#, 16#18#, 16#00#, 16#40#, 16#00#, 16#18#, 16#00#,
16#00#, 16#00#, 16#18#, 16#00#, 16#00#, 16#00#, 16#18#, 16#00#, 16#00#,
16#00#, 16#1C#, 16#00#, 16#00#, 16#00#, 16#0F#, 16#80#, 16#00#, 16#00#,
16#07#, 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#03#, 16#80#, 16#00#, 16#00#, 16#01#,
16#80#, 16#00#, 16#00#, 16#01#, 16#80#, 16#00#, 16#80#, 16#01#, 16#80#,
16#01#, 16#80#, 16#01#, 16#80#, 16#01#, 16#80#, 16#03#, 16#00#, 16#01#,
16#C0#, 16#0E#, 16#00#, 16#03#, 16#F0#, 16#3C#, 16#00#, 16#03#, 16#7F#,
16#F8#, 16#00#, 16#00#, 16#1F#, 16#C0#, 16#00#, 16#00#, 16#03#, 16#00#,
16#00#, 16#00#, 16#06#, 16#00#, 16#00#, 16#00#, 16#06#, 16#00#, 16#00#,
16#00#, 16#06#, 16#00#, 16#00#, 16#00#, 16#06#, 16#00#, 16#00#, 16#00#,
16#0C#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#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#00#, 16#00#,
16#07#, 16#F8#, 16#00#, 16#00#, 16#0E#, 16#18#, 16#00#, 16#00#, 16#1C#,
16#0C#, 16#00#, 16#00#, 16#18#, 16#0C#, 16#00#, 16#00#, 16#30#, 16#0C#,
16#00#, 16#00#, 16#30#, 16#0C#, 16#00#, 16#00#, 16#30#, 16#18#, 16#00#,
16#00#, 16#30#, 16#18#, 16#00#, 16#00#, 16#18#, 16#70#, 16#00#, 16#00#,
16#1F#, 16#E0#, 16#70#, 16#00#, 16#07#, 16#83#, 16#F0#, 16#00#, 16#00#,
16#1F#, 16#00#, 16#00#, 16#01#, 16#F8#, 16#00#, 16#00#, 16#0F#, 16#C0#,
16#00#, 16#00#, 16#7C#, 16#00#, 16#00#, 16#01#, 16#E0#, 16#00#, 16#00#,
16#01#, 16#00#, 16#7C#, 16#00#, 16#00#, 16#01#, 16#FE#, 16#00#, 16#00#,
16#03#, 16#86#, 16#00#, 16#00#, 16#07#, 16#03#, 16#00#, 16#00#, 16#06#,
16#03#, 16#00#, 16#00#, 16#0C#, 16#03#, 16#00#, 16#00#, 16#0C#, 16#03#,
16#00#, 16#00#, 16#0C#, 16#06#, 16#00#, 16#00#, 16#0C#, 16#06#, 16#00#,
16#00#, 16#06#, 16#1C#, 16#00#, 16#00#, 16#07#, 16#F8#, 16#00#, 16#00#,
16#01#, 16#E0#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#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#03#, 16#FF#, 16#00#,
16#00#, 16#07#, 16#0E#, 16#00#, 16#00#, 16#06#, 16#00#, 16#00#, 16#00#,
16#0C#, 16#00#, 16#00#, 16#00#, 16#0C#, 16#00#, 16#00#, 16#00#, 16#0C#,
16#00#, 16#00#, 16#00#, 16#0C#, 16#00#, 16#00#, 16#00#, 16#0C#, 16#00#,
16#00#, 16#00#, 16#06#, 16#00#, 16#00#, 16#00#, 16#06#, 16#00#, 16#00#,
16#00#, 16#3E#, 16#00#, 16#00#, 16#00#, 16#73#, 16#07#, 16#80#, 16#00#,
16#C3#, 16#07#, 16#80#, 16#01#, 16#C1#, 16#8C#, 16#00#, 16#01#, 16#81#,
16#8C#, 16#00#, 16#01#, 16#01#, 16#D8#, 16#00#, 16#03#, 16#00#, 16#D8#,
16#00#, 16#03#, 16#00#, 16#F0#, 16#00#, 16#03#, 16#00#, 16#60#, 16#00#,
16#03#, 16#80#, 16#E0#, 16#00#, 16#01#, 16#81#, 16#F0#, 16#00#, 16#01#,
16#C3#, 16#BE#, 16#00#, 16#00#, 16#FF#, 16#3E#, 16#00#, 16#00#, 16#7C#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#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#7E#, 16#00#, 16#00#, 16#00#, 16#7C#,
16#00#, 16#00#, 16#00#, 16#7C#, 16#00#, 16#00#, 16#00#, 16#7C#, 16#00#,
16#00#, 16#00#, 16#78#, 16#00#, 16#00#, 16#00#, 16#78#, 16#00#, 16#00#,
16#00#, 16#78#, 16#00#, 16#00#, 16#00#, 16#F0#, 16#00#, 16#00#, 16#00#,
16#F0#, 16#00#, 16#00#, 16#00#, 16#F0#, 16#00#, 16#00#, 16#00#, 16#E0#,
16#00#, 16#00#, 16#00#, 16#E0#, 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#60#, 16#00#, 16#00#, 16#00#, 16#E0#,
16#00#, 16#00#, 16#00#, 16#C0#, 16#00#, 16#00#, 16#01#, 16#80#, 16#00#,
16#00#, 16#03#, 16#80#, 16#00#, 16#00#, 16#07#, 16#00#, 16#00#, 16#00#,
16#06#, 16#00#, 16#00#, 16#00#, 16#0E#, 16#00#, 16#00#, 16#00#, 16#0C#,
16#00#, 16#00#, 16#00#, 16#1C#, 16#00#, 16#00#, 16#00#, 16#38#, 16#00#,
16#00#, 16#00#, 16#38#, 16#00#, 16#00#, 16#00#, 16#30#, 16#00#, 16#00#,
16#00#, 16#70#, 16#00#, 16#00#, 16#00#, 16#70#, 16#00#, 16#00#, 16#00#,
16#60#, 16#00#, 16#00#, 16#00#, 16#E0#, 16#00#, 16#00#, 16#00#, 16#E0#,
16#00#, 16#00#, 16#00#, 16#E0#, 16#00#, 16#00#, 16#00#, 16#E0#, 16#00#,
16#00#, 16#00#, 16#E0#, 16#00#, 16#00#, 16#00#, 16#E0#, 16#00#, 16#00#,
16#00#, 16#E0#, 16#00#, 16#00#, 16#00#, 16#E0#, 16#00#, 16#00#, 16#00#,
16#E0#, 16#00#, 16#00#, 16#00#, 16#E0#, 16#00#, 16#00#, 16#00#, 16#E0#,
16#00#, 16#00#, 16#00#, 16#60#, 16#00#, 16#00#, 16#00#, 16#60#, 16#00#,
16#00#, 16#00#, 16#70#, 16#00#, 16#00#, 16#00#, 16#70#, 16#00#, 16#00#,
16#00#, 16#30#, 16#00#, 16#00#, 16#00#, 16#30#, 16#00#, 16#00#, 16#00#,
16#10#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#06#, 16#00#, 16#00#, 16#00#, 16#06#, 16#00#, 16#00#, 16#00#,
16#07#, 16#00#, 16#00#, 16#00#, 16#03#, 16#00#, 16#00#, 16#00#, 16#03#,
16#00#, 16#00#, 16#00#, 16#03#, 16#80#, 16#00#, 16#00#, 16#03#, 16#80#,
16#00#, 16#00#, 16#03#, 16#80#, 16#00#, 16#00#, 16#01#, 16#80#, 16#00#,
16#00#, 16#01#, 16#80#, 16#00#, 16#00#, 16#01#, 16#80#, 16#00#, 16#00#,
16#01#, 16#80#, 16#00#, 16#00#, 16#01#, 16#80#, 16#00#, 16#00#, 16#01#,
16#80#, 16#00#, 16#00#, 16#03#, 16#80#, 16#00#, 16#00#, 16#03#, 16#80#,
16#00#, 16#00#, 16#03#, 16#80#, 16#00#, 16#00#, 16#03#, 16#80#, 16#00#,
16#00#, 16#03#, 16#80#, 16#00#, 16#00#, 16#07#, 16#00#, 16#00#, 16#00#,
16#07#, 16#00#, 16#00#, 16#00#, 16#06#, 16#00#, 16#00#, 16#00#, 16#0E#,
16#00#, 16#00#, 16#00#, 16#0E#, 16#00#, 16#00#, 16#00#, 16#1C#, 16#00#,
16#00#, 16#00#, 16#18#, 16#00#, 16#00#, 16#00#, 16#38#, 16#00#, 16#00#,
16#00#, 16#30#, 16#00#, 16#00#, 16#00#, 16#60#, 16#00#, 16#00#, 16#00#,
16#E0#, 16#00#, 16#00#, 16#00#, 16#C0#, 16#00#, 16#00#, 16#01#, 16#80#,
16#00#, 16#00#, 16#03#, 16#00#, 16#00#, 16#00#, 16#02#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#08#, 16#00#, 16#00#,
16#00#, 16#18#, 16#00#, 16#00#, 16#00#, 16#18#, 16#00#, 16#00#, 16#00#,
16#38#, 16#00#, 16#00#, 16#00#, 16#30#, 16#00#, 16#00#, 16#00#, 16#30#,
16#00#, 16#00#, 16#38#, 16#30#, 16#20#, 16#00#, 16#3F#, 16#33#, 16#E0#,
16#00#, 16#0F#, 16#FF#, 16#80#, 16#00#, 16#01#, 16#FC#, 16#00#, 16#00#,
16#00#, 16#F0#, 16#00#, 16#00#, 16#01#, 16#F0#, 16#00#, 16#00#, 16#03#,
16#B8#, 16#00#, 16#00#, 16#07#, 16#18#, 16#00#, 16#00#, 16#0E#, 16#1C#,
16#00#, 16#00#, 16#1C#, 16#0C#, 16#00#, 16#00#, 16#18#, 16#0C#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#30#, 16#00#,
16#00#, 16#00#, 16#30#, 16#00#, 16#00#, 16#00#, 16#30#, 16#00#, 16#00#,
16#00#, 16#60#, 16#00#, 16#00#, 16#00#, 16#60#, 16#00#, 16#00#, 16#00#,
16#60#, 16#00#, 16#00#, 16#00#, 16#60#, 16#00#, 16#00#, 16#00#, 16#60#,
16#00#, 16#00#, 16#00#, 16#C0#, 16#00#, 16#00#, 16#00#, 16#C0#, 16#00#,
16#03#, 16#FF#, 16#FF#, 16#F0#, 16#03#, 16#FF#, 16#FF#, 16#E0#, 16#00#,
16#00#, 16#C0#, 16#00#, 16#00#, 16#01#, 16#80#, 16#00#, 16#00#, 16#01#,
16#80#, 16#00#, 16#00#, 16#01#, 16#80#, 16#00#, 16#00#, 16#01#, 16#80#,
16#00#, 16#00#, 16#03#, 16#00#, 16#00#, 16#00#, 16#03#, 16#00#, 16#00#,
16#00#, 16#03#, 16#00#, 16#00#, 16#00#, 16#03#, 16#00#, 16#00#, 16#00#,
16#02#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#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#00#, 16#00#, 16#00#,
16#3F#, 16#00#, 16#00#, 16#00#, 16#7E#, 16#00#, 16#00#, 16#00#, 16#7C#,
16#00#, 16#00#, 16#00#, 16#78#, 16#00#, 16#00#, 16#00#, 16#F8#, 16#00#,
16#00#, 16#00#, 16#F0#, 16#00#, 16#00#, 16#01#, 16#E0#, 16#00#, 16#00#,
16#01#, 16#C0#, 16#00#, 16#00#, 16#03#, 16#C0#, 16#00#, 16#00#, 16#03#,
16#80#, 16#00#, 16#00#, 16#07#, 16#00#, 16#00#, 16#00#, 16#06#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#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#F0#, 16#03#, 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#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#07#, 16#80#,
16#00#, 16#00#, 16#0F#, 16#C0#, 16#00#, 16#00#, 16#1F#, 16#C0#, 16#00#,
16#00#, 16#1F#, 16#C0#, 16#00#, 16#00#, 16#1F#, 16#80#, 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#18#, 16#00#, 16#00#, 16#00#, 16#18#, 16#00#,
16#00#, 16#00#, 16#30#, 16#00#, 16#00#, 16#00#, 16#60#, 16#00#, 16#00#,
16#00#, 16#60#, 16#00#, 16#00#, 16#00#, 16#C0#, 16#00#, 16#00#, 16#01#,
16#80#, 16#00#, 16#00#, 16#01#, 16#80#, 16#00#, 16#00#, 16#03#, 16#00#,
16#00#, 16#00#, 16#06#, 16#00#, 16#00#, 16#00#, 16#06#, 16#00#, 16#00#,
16#00#, 16#0C#, 16#00#, 16#00#, 16#00#, 16#18#, 16#00#, 16#00#, 16#00#,
16#38#, 16#00#, 16#00#, 16#00#, 16#30#, 16#00#, 16#00#, 16#00#, 16#60#,
16#00#, 16#00#, 16#00#, 16#E0#, 16#00#, 16#00#, 16#00#, 16#C0#, 16#00#,
16#00#, 16#01#, 16#80#, 16#00#, 16#00#, 16#03#, 16#80#, 16#00#, 16#00#,
16#03#, 16#00#, 16#00#, 16#00#, 16#06#, 16#00#, 16#00#, 16#00#, 16#0C#,
16#00#, 16#00#, 16#00#, 16#0C#, 16#00#, 16#00#, 16#00#, 16#18#, 16#00#,
16#00#, 16#00#, 16#30#, 16#00#, 16#00#, 16#00#, 16#30#, 16#00#, 16#00#,
16#00#, 16#60#, 16#00#, 16#00#, 16#00#, 16#C0#, 16#00#, 16#00#, 16#00#,
16#C0#, 16#00#, 16#00#, 16#01#, 16#80#, 16#00#, 16#00#, 16#03#, 16#00#,
16#00#, 16#00#, 16#07#, 16#00#, 16#00#, 16#00#, 16#06#, 16#00#, 16#00#,
16#00#, 16#04#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#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#01#, 16#FF#, 16#00#, 16#00#, 16#03#, 16#83#,
16#80#, 16#00#, 16#07#, 16#01#, 16#C0#, 16#00#, 16#0E#, 16#00#, 16#C0#,
16#00#, 16#0C#, 16#00#, 16#E0#, 16#00#, 16#18#, 16#00#, 16#60#, 16#00#,
16#38#, 16#00#, 16#60#, 16#00#, 16#30#, 16#00#, 16#60#, 16#00#, 16#30#,
16#00#, 16#60#, 16#00#, 16#60#, 16#00#, 16#60#, 16#00#, 16#60#, 16#00#,
16#60#, 16#00#, 16#60#, 16#00#, 16#C0#, 16#00#, 16#60#, 16#00#, 16#C0#,
16#00#, 16#C0#, 16#00#, 16#C0#, 16#00#, 16#C0#, 16#00#, 16#C0#, 16#00#,
16#C0#, 16#00#, 16#C0#, 16#00#, 16#C0#, 16#01#, 16#80#, 16#00#, 16#C0#,
16#01#, 16#80#, 16#01#, 16#80#, 16#01#, 16#80#, 16#01#, 16#80#, 16#03#,
16#00#, 16#01#, 16#80#, 16#03#, 16#00#, 16#01#, 16#80#, 16#06#, 16#00#,
16#01#, 16#C0#, 16#06#, 16#00#, 16#00#, 16#C0#, 16#0C#, 16#00#, 16#00#,
16#C0#, 16#1C#, 16#00#, 16#00#, 16#E0#, 16#38#, 16#00#, 16#00#, 16#70#,
16#70#, 16#00#, 16#00#, 16#3F#, 16#E0#, 16#00#, 16#00#, 16#1F#, 16#80#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#38#,
16#00#, 16#00#, 16#00#, 16#78#, 16#00#, 16#00#, 16#00#, 16#F8#, 16#00#,
16#00#, 16#01#, 16#D8#, 16#00#, 16#00#, 16#07#, 16#30#, 16#00#, 16#00#,
16#0E#, 16#30#, 16#00#, 16#00#, 16#1C#, 16#30#, 16#00#, 16#00#, 16#18#,
16#30#, 16#00#, 16#00#, 16#00#, 16#20#, 16#00#, 16#00#, 16#00#, 16#60#,
16#00#, 16#00#, 16#00#, 16#60#, 16#00#, 16#00#, 16#00#, 16#60#, 16#00#,
16#00#, 16#00#, 16#60#, 16#00#, 16#00#, 16#00#, 16#C0#, 16#00#, 16#00#,
16#00#, 16#C0#, 16#00#, 16#00#, 16#00#, 16#C0#, 16#00#, 16#00#, 16#00#,
16#C0#, 16#00#, 16#00#, 16#00#, 16#C0#, 16#00#, 16#00#, 16#01#, 16#80#,
16#00#, 16#00#, 16#01#, 16#80#, 16#00#, 16#00#, 16#01#, 16#80#, 16#00#,
16#00#, 16#01#, 16#80#, 16#00#, 16#00#, 16#01#, 16#00#, 16#00#, 16#00#,
16#03#, 16#00#, 16#00#, 16#00#, 16#03#, 16#00#, 16#00#, 16#00#, 16#03#,
16#00#, 16#00#, 16#00#, 16#03#, 16#00#, 16#00#, 16#03#, 16#FF#, 16#FE#,
16#00#, 16#03#, 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#7E#, 16#00#,
16#00#, 16#03#, 16#FF#, 16#00#, 16#00#, 16#07#, 16#03#, 16#80#, 16#00#,
16#0E#, 16#01#, 16#C0#, 16#00#, 16#18#, 16#00#, 16#E0#, 16#00#, 16#38#,
16#00#, 16#60#, 16#00#, 16#30#, 16#00#, 16#60#, 16#00#, 16#20#, 16#00#,
16#60#, 16#00#, 16#00#, 16#00#, 16#60#, 16#00#, 16#00#, 16#00#, 16#C0#,
16#00#, 16#00#, 16#00#, 16#C0#, 16#00#, 16#00#, 16#01#, 16#80#, 16#00#,
16#00#, 16#03#, 16#00#, 16#00#, 16#00#, 16#06#, 16#00#, 16#00#, 16#00#,
16#1C#, 16#00#, 16#00#, 16#00#, 16#38#, 16#00#, 16#00#, 16#00#, 16#70#,
16#00#, 16#00#, 16#00#, 16#C0#, 16#00#, 16#00#, 16#03#, 16#80#, 16#00#,
16#00#, 16#07#, 16#00#, 16#00#, 16#00#, 16#0E#, 16#00#, 16#00#, 16#00#,
16#38#, 16#00#, 16#00#, 16#00#, 16#70#, 16#00#, 16#00#, 16#00#, 16#E0#,
16#00#, 16#00#, 16#01#, 16#80#, 16#00#, 16#00#, 16#07#, 16#00#, 16#06#,
16#00#, 16#0E#, 16#00#, 16#06#, 16#00#, 16#0F#, 16#FF#, 16#FE#, 16#00#,
16#0F#, 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#7E#, 16#00#, 16#00#,
16#03#, 16#FF#, 16#80#, 16#00#, 16#07#, 16#03#, 16#C0#, 16#00#, 16#0C#,
16#00#, 16#E0#, 16#00#, 16#18#, 16#00#, 16#60#, 16#00#, 16#00#, 16#00#,
16#60#, 16#00#, 16#00#, 16#00#, 16#60#, 16#00#, 16#00#, 16#00#, 16#60#,
16#00#, 16#00#, 16#00#, 16#60#, 16#00#, 16#00#, 16#00#, 16#C0#, 16#00#,
16#00#, 16#00#, 16#C0#, 16#00#, 16#00#, 16#01#, 16#80#, 16#00#, 16#00#,
16#07#, 16#00#, 16#00#, 16#01#, 16#FC#, 16#00#, 16#00#, 16#01#, 16#F8#,
16#00#, 16#00#, 16#00#, 16#1E#, 16#00#, 16#00#, 16#00#, 16#07#, 16#00#,
16#00#, 16#00#, 16#03#, 16#80#, 16#00#, 16#00#, 16#01#, 16#80#, 16#00#,
16#00#, 16#01#, 16#80#, 16#00#, 16#00#, 16#01#, 16#80#, 16#00#, 16#00#,
16#01#, 16#80#, 16#00#, 16#00#, 16#01#, 16#80#, 16#00#, 16#00#, 16#03#,
16#80#, 16#00#, 16#00#, 16#03#, 16#00#, 16#02#, 16#00#, 16#06#, 16#00#,
16#07#, 16#00#, 16#1C#, 16#00#, 16#03#, 16#C0#, 16#78#, 16#00#, 16#00#,
16#FF#, 16#E0#, 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#07#, 16#C0#, 16#00#, 16#00#, 16#0F#, 16#80#, 16#00#, 16#00#, 16#0D#,
16#80#, 16#00#, 16#00#, 16#19#, 16#80#, 16#00#, 16#00#, 16#31#, 16#80#,
16#00#, 16#00#, 16#63#, 16#00#, 16#00#, 16#00#, 16#C3#, 16#00#, 16#00#,
16#01#, 16#C3#, 16#00#, 16#00#, 16#01#, 16#83#, 16#00#, 16#00#, 16#03#,
16#03#, 16#00#, 16#00#, 16#06#, 16#06#, 16#00#, 16#00#, 16#0C#, 16#06#,
16#00#, 16#00#, 16#18#, 16#06#, 16#00#, 16#00#, 16#18#, 16#06#, 16#00#,
16#00#, 16#30#, 16#0C#, 16#00#, 16#00#, 16#60#, 16#0C#, 16#00#, 16#00#,
16#C0#, 16#0C#, 16#00#, 16#01#, 16#80#, 16#0C#, 16#00#, 16#01#, 16#FF#,
16#FF#, 16#00#, 16#01#, 16#FF#, 16#FF#, 16#00#, 16#00#, 16#00#, 16#18#,
16#00#, 16#00#, 16#00#, 16#18#, 16#00#, 16#00#, 16#00#, 16#18#, 16#00#,
16#00#, 16#00#, 16#18#, 16#00#, 16#00#, 16#00#, 16#30#, 16#00#, 16#00#,
16#00#, 16#30#, 16#00#, 16#00#, 16#07#, 16#FE#, 16#00#, 16#00#, 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#07#, 16#FF#,
16#E0#, 16#00#, 16#07#, 16#FF#, 16#E0#, 16#00#, 16#04#, 16#00#, 16#00#,
16#00#, 16#0C#, 16#00#, 16#00#, 16#00#, 16#0C#, 16#00#, 16#00#, 16#00#,
16#0C#, 16#00#, 16#00#, 16#00#, 16#0C#, 16#00#, 16#00#, 16#00#, 16#18#,
16#00#, 16#00#, 16#00#, 16#18#, 16#00#, 16#00#, 16#00#, 16#18#, 16#00#,
16#00#, 16#00#, 16#1B#, 16#FC#, 16#00#, 16#00#, 16#1F#, 16#FF#, 16#00#,
16#00#, 16#3E#, 16#07#, 16#00#, 16#00#, 16#10#, 16#03#, 16#80#, 16#00#,
16#00#, 16#01#, 16#80#, 16#00#, 16#00#, 16#00#, 16#C0#, 16#00#, 16#00#,
16#00#, 16#C0#, 16#00#, 16#00#, 16#00#, 16#C0#, 16#00#, 16#00#, 16#00#,
16#C0#, 16#00#, 16#00#, 16#01#, 16#80#, 16#00#, 16#00#, 16#01#, 16#80#,
16#00#, 16#00#, 16#01#, 16#80#, 16#00#, 16#00#, 16#03#, 16#00#, 16#00#,
16#00#, 16#07#, 16#00#, 16#02#, 16#00#, 16#0E#, 16#00#, 16#07#, 16#80#,
16#1C#, 16#00#, 16#03#, 16#E0#, 16#78#, 16#00#, 16#00#, 16#FF#, 16#E0#,
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#01#, 16#F8#, 16#00#, 16#00#, 16#0F#, 16#FC#,
16#00#, 16#00#, 16#3E#, 16#00#, 16#00#, 16#00#, 16#70#, 16#00#, 16#00#,
16#01#, 16#C0#, 16#00#, 16#00#, 16#03#, 16#80#, 16#00#, 16#00#, 16#03#,
16#00#, 16#00#, 16#00#, 16#06#, 16#00#, 16#00#, 16#00#, 16#0C#, 16#00#,
16#00#, 16#00#, 16#1C#, 16#00#, 16#00#, 16#00#, 16#18#, 16#00#, 16#00#,
16#00#, 16#18#, 16#00#, 16#00#, 16#00#, 16#30#, 16#7C#, 16#00#, 16#00#,
16#31#, 16#FF#, 16#00#, 16#00#, 16#63#, 16#87#, 16#80#, 16#00#, 16#66#,
16#01#, 16#80#, 16#00#, 16#6C#, 16#01#, 16#C0#, 16#00#, 16#78#, 16#00#,
16#C0#, 16#00#, 16#70#, 16#00#, 16#C0#, 16#00#, 16#60#, 16#00#, 16#C0#,
16#00#, 16#40#, 16#00#, 16#C0#, 16#00#, 16#40#, 16#00#, 16#C0#, 16#00#,
16#60#, 16#01#, 16#80#, 16#00#, 16#60#, 16#01#, 16#80#, 16#00#, 16#60#,
16#03#, 16#00#, 16#00#, 16#70#, 16#07#, 16#00#, 16#00#, 16#30#, 16#0E#,
16#00#, 16#00#, 16#1C#, 16#1C#, 16#00#, 16#00#, 16#1F#, 16#F8#, 16#00#,
16#00#, 16#07#, 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#1F#, 16#FF#, 16#F0#, 16#00#,
16#1F#, 16#FF#, 16#F0#, 16#00#, 16#30#, 16#00#, 16#30#, 16#00#, 16#30#,
16#00#, 16#30#, 16#00#, 16#00#, 16#00#, 16#60#, 16#00#, 16#00#, 16#00#,
16#60#, 16#00#, 16#00#, 16#00#, 16#C0#, 16#00#, 16#00#, 16#01#, 16#80#,
16#00#, 16#00#, 16#01#, 16#80#, 16#00#, 16#00#, 16#03#, 16#00#, 16#00#,
16#00#, 16#03#, 16#00#, 16#00#, 16#00#, 16#06#, 16#00#, 16#00#, 16#00#,
16#06#, 16#00#, 16#00#, 16#00#, 16#0C#, 16#00#, 16#00#, 16#00#, 16#0C#,
16#00#, 16#00#, 16#00#, 16#18#, 16#00#, 16#00#, 16#00#, 16#18#, 16#00#,
16#00#, 16#00#, 16#30#, 16#00#, 16#00#, 16#00#, 16#30#, 16#00#, 16#00#,
16#00#, 16#60#, 16#00#, 16#00#, 16#00#, 16#60#, 16#00#, 16#00#, 16#00#,
16#C0#, 16#00#, 16#00#, 16#01#, 16#80#, 16#00#, 16#00#, 16#01#, 16#80#,
16#00#, 16#00#, 16#03#, 16#00#, 16#00#, 16#00#, 16#03#, 16#00#, 16#00#,
16#00#, 16#06#, 16#00#, 16#00#, 16#00#, 16#06#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#7E#, 16#00#, 16#00#, 16#01#, 16#FF#, 16#80#, 16#00#, 16#03#,
16#83#, 16#C0#, 16#00#, 16#06#, 16#00#, 16#C0#, 16#00#, 16#0C#, 16#00#,
16#60#, 16#00#, 16#18#, 16#00#, 16#60#, 16#00#, 16#18#, 16#00#, 16#60#,
16#00#, 16#30#, 16#00#, 16#60#, 16#00#, 16#30#, 16#00#, 16#60#, 16#00#,
16#30#, 16#00#, 16#C0#, 16#00#, 16#38#, 16#01#, 16#C0#, 16#00#, 16#18#,
16#03#, 16#80#, 16#00#, 16#0E#, 16#0F#, 16#00#, 16#00#, 16#07#, 16#FC#,
16#00#, 16#00#, 16#07#, 16#FC#, 16#00#, 16#00#, 16#1C#, 16#0E#, 16#00#,
16#00#, 16#30#, 16#07#, 16#00#, 16#00#, 16#60#, 16#03#, 16#00#, 16#00#,
16#C0#, 16#03#, 16#00#, 16#01#, 16#80#, 16#01#, 16#80#, 16#01#, 16#80#,
16#01#, 16#80#, 16#01#, 16#80#, 16#01#, 16#00#, 16#01#, 16#80#, 16#03#,
16#00#, 16#01#, 16#80#, 16#03#, 16#00#, 16#01#, 16#80#, 16#06#, 16#00#,
16#01#, 16#80#, 16#0E#, 16#00#, 16#00#, 16#C0#, 16#1C#, 16#00#, 16#00#,
16#F0#, 16#78#, 16#00#, 16#00#, 16#7F#, 16#E0#, 16#00#, 16#00#, 16#1F#,
16#80#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#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#FF#, 16#80#, 16#00#, 16#01#, 16#C1#,
16#C0#, 16#00#, 16#07#, 16#00#, 16#C0#, 16#00#, 16#06#, 16#00#, 16#60#,
16#00#, 16#0C#, 16#00#, 16#60#, 16#00#, 16#18#, 16#00#, 16#60#, 16#00#,
16#18#, 16#00#, 16#30#, 16#00#, 16#18#, 16#00#, 16#30#, 16#00#, 16#30#,
16#00#, 16#30#, 16#00#, 16#30#, 16#00#, 16#70#, 16#00#, 16#30#, 16#00#,
16#F0#, 16#00#, 16#38#, 16#01#, 16#A0#, 16#00#, 16#18#, 16#03#, 16#E0#,
16#00#, 16#1C#, 16#07#, 16#60#, 16#00#, 16#0E#, 16#0E#, 16#60#, 16#00#,
16#07#, 16#F8#, 16#60#, 16#00#, 16#03#, 16#E0#, 16#C0#, 16#00#, 16#00#,
16#00#, 16#C0#, 16#00#, 16#00#, 16#01#, 16#80#, 16#00#, 16#00#, 16#01#,
16#80#, 16#00#, 16#00#, 16#03#, 16#00#, 16#00#, 16#00#, 16#07#, 16#00#,
16#00#, 16#00#, 16#0E#, 16#00#, 16#00#, 16#00#, 16#1C#, 16#00#, 16#00#,
16#00#, 16#38#, 16#00#, 16#00#, 16#00#, 16#F0#, 16#00#, 16#00#, 16#03#,
16#C0#, 16#00#, 16#01#, 16#FF#, 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#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#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#01#, 16#F8#, 16#00#, 16#00#, 16#03#, 16#F8#, 16#00#,
16#00#, 16#03#, 16#F8#, 16#00#, 16#00#, 16#03#, 16#F0#, 16#00#, 16#00#,
16#01#, 16#E0#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#07#, 16#80#, 16#00#, 16#00#, 16#0F#,
16#C0#, 16#00#, 16#00#, 16#1F#, 16#C0#, 16#00#, 16#00#, 16#1F#, 16#C0#,
16#00#, 16#00#, 16#1F#, 16#80#, 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#01#, 16#E0#, 16#00#,
16#00#, 16#03#, 16#F0#, 16#00#, 16#00#, 16#07#, 16#F0#, 16#00#, 16#00#,
16#07#, 16#F0#, 16#00#, 16#00#, 16#07#, 16#E0#, 16#00#, 16#00#, 16#03#,
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#1F#, 16#80#, 16#00#, 16#00#, 16#1F#,
16#80#, 16#00#, 16#00#, 16#3F#, 16#00#, 16#00#, 16#00#, 16#3E#, 16#00#,
16#00#, 16#00#, 16#7C#, 16#00#, 16#00#, 16#00#, 16#7C#, 16#00#, 16#00#,
16#00#, 16#F8#, 16#00#, 16#00#, 16#00#, 16#F0#, 16#00#, 16#00#, 16#01#,
16#E0#, 16#00#, 16#00#, 16#01#, 16#E0#, 16#00#, 16#00#, 16#03#, 16#C0#,
16#00#, 16#00#, 16#03#, 16#80#, 16#00#, 16#00#, 16#07#, 16#00#, 16#00#,
16#00#, 16#02#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#18#, 16#00#, 16#00#, 16#00#, 16#78#, 16#00#, 16#00#, 16#01#, 16#E0#,
16#00#, 16#00#, 16#07#, 16#80#, 16#00#, 16#00#, 16#1E#, 16#00#, 16#00#,
16#00#, 16#78#, 16#00#, 16#00#, 16#01#, 16#E0#, 16#00#, 16#00#, 16#07#,
16#80#, 16#00#, 16#00#, 16#1E#, 16#00#, 16#00#, 16#00#, 16#78#, 16#00#,
16#00#, 16#01#, 16#E0#, 16#00#, 16#00#, 16#01#, 16#E0#, 16#00#, 16#00#,
16#00#, 16#78#, 16#00#, 16#00#, 16#00#, 16#3C#, 16#00#, 16#00#, 16#00#,
16#0F#, 16#00#, 16#00#, 16#00#, 16#03#, 16#80#, 16#00#, 16#00#, 16#01#,
16#E0#, 16#00#, 16#00#, 16#00#, 16#78#, 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#80#,
16#00#, 16#00#, 16#01#, 16#80#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#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#F8#, 16#03#, 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#07#, 16#FF#, 16#FF#, 16#F0#, 16#07#, 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#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#60#, 16#00#, 16#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#01#, 16#E0#,
16#00#, 16#00#, 16#00#, 16#78#, 16#00#, 16#00#, 16#00#, 16#1C#, 16#00#,
16#00#, 16#00#, 16#0F#, 16#00#, 16#00#, 16#00#, 16#03#, 16#C0#, 16#00#,
16#00#, 16#01#, 16#E0#, 16#00#, 16#00#, 16#03#, 16#C0#, 16#00#, 16#00#,
16#0F#, 16#00#, 16#00#, 16#00#, 16#3C#, 16#00#, 16#00#, 16#00#, 16#F0#,
16#00#, 16#00#, 16#03#, 16#C0#, 16#00#, 16#00#, 16#0F#, 16#00#, 16#00#,
16#00#, 16#3C#, 16#00#, 16#00#, 16#00#, 16#F0#, 16#00#, 16#00#, 16#03#,
16#C0#, 16#00#, 16#00#, 16#07#, 16#00#, 16#00#, 16#00#, 16#0C#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#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#03#, 16#FF#, 16#80#, 16#00#,
16#0F#, 16#01#, 16#C0#, 16#00#, 16#18#, 16#00#, 16#E0#, 16#00#, 16#18#,
16#00#, 16#60#, 16#00#, 16#18#, 16#00#, 16#60#, 16#00#, 16#00#, 16#00#,
16#60#, 16#00#, 16#00#, 16#00#, 16#60#, 16#00#, 16#00#, 16#00#, 16#60#,
16#00#, 16#00#, 16#00#, 16#C0#, 16#00#, 16#00#, 16#01#, 16#80#, 16#00#,
16#00#, 16#07#, 16#00#, 16#00#, 16#00#, 16#1E#, 16#00#, 16#00#, 16#00#,
16#78#, 16#00#, 16#00#, 16#00#, 16#E0#, 16#00#, 16#00#, 16#01#, 16#C0#,
16#00#, 16#00#, 16#01#, 16#80#, 16#00#, 16#00#, 16#01#, 16#80#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#07#, 16#80#, 16#00#, 16#00#, 16#0F#, 16#C0#,
16#00#, 16#00#, 16#1F#, 16#C0#, 16#00#, 16#00#, 16#1F#, 16#80#, 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#7E#, 16#00#, 16#00#, 16#01#, 16#FF#, 16#80#, 16#00#,
16#03#, 16#83#, 16#C0#, 16#00#, 16#07#, 16#00#, 16#C0#, 16#00#, 16#0C#,
16#00#, 16#C0#, 16#00#, 16#1C#, 16#00#, 16#C0#, 16#00#, 16#18#, 16#00#,
16#C0#, 16#00#, 16#30#, 16#00#, 16#C0#, 16#00#, 16#30#, 16#00#, 16#C0#,
16#00#, 16#60#, 16#0F#, 16#C0#, 16#00#, 16#60#, 16#3F#, 16#80#, 16#00#,
16#60#, 16#71#, 16#80#, 16#00#, 16#C0#, 16#C1#, 16#80#, 16#00#, 16#C1#,
16#81#, 16#80#, 16#00#, 16#C1#, 16#81#, 16#80#, 16#00#, 16#C3#, 16#03#,
16#00#, 16#00#, 16#C3#, 16#03#, 16#00#, 16#01#, 16#83#, 16#03#, 16#00#,
16#01#, 16#83#, 16#03#, 16#00#, 16#01#, 16#83#, 16#83#, 16#00#, 16#01#,
16#81#, 16#FF#, 16#00#, 16#01#, 16#80#, 16#7F#, 16#00#, 16#01#, 16#80#,
16#00#, 16#00#, 16#01#, 16#80#, 16#00#, 16#00#, 16#01#, 16#80#, 16#00#,
16#00#, 16#01#, 16#80#, 16#00#, 16#00#, 16#01#, 16#80#, 16#00#, 16#00#,
16#01#, 16#C0#, 16#00#, 16#00#, 16#00#, 16#C0#, 16#00#, 16#00#, 16#00#,
16#F0#, 16#18#, 16#00#, 16#00#, 16#7F#, 16#F0#, 16#00#, 16#00#, 16#1F#,
16#C0#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#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#F8#, 16#00#, 16#00#, 16#3F#, 16#F8#,
16#00#, 16#00#, 16#00#, 16#DC#, 16#00#, 16#00#, 16#00#, 16#CC#, 16#00#,
16#00#, 16#01#, 16#8C#, 16#00#, 16#00#, 16#01#, 16#8C#, 16#00#, 16#00#,
16#03#, 16#0C#, 16#00#, 16#00#, 16#06#, 16#0C#, 16#00#, 16#00#, 16#06#,
16#06#, 16#00#, 16#00#, 16#0C#, 16#06#, 16#00#, 16#00#, 16#08#, 16#06#,
16#00#, 16#00#, 16#18#, 16#06#, 16#00#, 16#00#, 16#30#, 16#06#, 16#00#,
16#00#, 16#30#, 16#06#, 16#00#, 16#00#, 16#60#, 16#03#, 16#00#, 16#00#,
16#7F#, 16#FF#, 16#00#, 16#00#, 16#FF#, 16#FF#, 16#00#, 16#01#, 16#80#,
16#03#, 16#00#, 16#01#, 16#80#, 16#03#, 16#00#, 16#03#, 16#00#, 16#03#,
16#00#, 16#03#, 16#00#, 16#01#, 16#80#, 16#06#, 16#00#, 16#01#, 16#80#,
16#0C#, 16#00#, 16#01#, 16#80#, 16#0C#, 16#00#, 16#01#, 16#80#, 16#7F#,
16#C0#, 16#3F#, 16#F0#, 16#7F#, 16#C0#, 16#3F#, 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#FF#, 16#FF#, 16#00#, 16#01#, 16#FF#, 16#FF#, 16#C0#,
16#00#, 16#18#, 16#01#, 16#E0#, 16#00#, 16#18#, 16#00#, 16#60#, 16#00#,
16#30#, 16#00#, 16#30#, 16#00#, 16#30#, 16#00#, 16#30#, 16#00#, 16#30#,
16#00#, 16#30#, 16#00#, 16#30#, 16#00#, 16#60#, 16#00#, 16#20#, 16#00#,
16#60#, 16#00#, 16#60#, 16#01#, 16#C0#, 16#00#, 16#60#, 16#07#, 16#80#,
16#00#, 16#7F#, 16#FE#, 16#00#, 16#00#, 16#7F#, 16#FF#, 16#00#, 16#00#,
16#40#, 16#03#, 16#80#, 16#00#, 16#C0#, 16#00#, 16#C0#, 16#00#, 16#C0#,
16#00#, 16#E0#, 16#00#, 16#C0#, 16#00#, 16#60#, 16#00#, 16#C0#, 16#00#,
16#60#, 16#01#, 16#80#, 16#00#, 16#60#, 16#01#, 16#80#, 16#00#, 16#60#,
16#01#, 16#80#, 16#00#, 16#C0#, 16#01#, 16#80#, 16#00#, 16#C0#, 16#01#,
16#00#, 16#03#, 16#80#, 16#03#, 16#00#, 16#07#, 16#00#, 16#3F#, 16#FF#,
16#FE#, 16#00#, 16#3F#, 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#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#7E#, 16#00#,
16#00#, 16#03#, 16#FF#, 16#8C#, 16#00#, 16#07#, 16#81#, 16#EC#, 16#00#,
16#1C#, 16#00#, 16#78#, 16#00#, 16#38#, 16#00#, 16#38#, 16#00#, 16#70#,
16#00#, 16#38#, 16#00#, 16#60#, 16#00#, 16#18#, 16#00#, 16#C0#, 16#00#,
16#18#, 16#01#, 16#80#, 16#00#, 16#10#, 16#01#, 16#80#, 16#00#, 16#00#,
16#03#, 16#80#, 16#00#, 16#00#, 16#03#, 16#00#, 16#00#, 16#00#, 16#03#,
16#00#, 16#00#, 16#00#, 16#03#, 16#00#, 16#00#, 16#00#, 16#03#, 16#00#,
16#00#, 16#00#, 16#06#, 16#00#, 16#00#, 16#00#, 16#06#, 16#00#, 16#00#,
16#00#, 16#06#, 16#00#, 16#00#, 16#00#, 16#06#, 16#00#, 16#00#, 16#00#,
16#06#, 16#00#, 16#00#, 16#00#, 16#07#, 16#00#, 16#00#, 16#00#, 16#03#,
16#00#, 16#00#, 16#00#, 16#03#, 16#80#, 16#00#, 16#C0#, 16#01#, 16#80#,
16#01#, 16#C0#, 16#01#, 16#E0#, 16#07#, 16#80#, 16#00#, 16#F0#, 16#1E#,
16#00#, 16#00#, 16#3F#, 16#F8#, 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#FF#, 16#FC#, 16#00#, 16#01#, 16#FF#, 16#FF#, 16#00#, 16#00#, 16#30#,
16#03#, 16#80#, 16#00#, 16#30#, 16#01#, 16#C0#, 16#00#, 16#30#, 16#00#,
16#E0#, 16#00#, 16#60#, 16#00#, 16#60#, 16#00#, 16#60#, 16#00#, 16#70#,
16#00#, 16#60#, 16#00#, 16#30#, 16#00#, 16#60#, 16#00#, 16#30#, 16#00#,
16#C0#, 16#00#, 16#30#, 16#00#, 16#C0#, 16#00#, 16#30#, 16#00#, 16#C0#,
16#00#, 16#30#, 16#00#, 16#C0#, 16#00#, 16#60#, 16#00#, 16#C0#, 16#00#,
16#60#, 16#01#, 16#80#, 16#00#, 16#60#, 16#01#, 16#80#, 16#00#, 16#60#,
16#01#, 16#80#, 16#00#, 16#C0#, 16#01#, 16#80#, 16#00#, 16#C0#, 16#03#,
16#00#, 16#01#, 16#80#, 16#03#, 16#00#, 16#01#, 16#80#, 16#03#, 16#00#,
16#03#, 16#00#, 16#03#, 16#00#, 16#0E#, 16#00#, 16#03#, 16#00#, 16#1C#,
16#00#, 16#06#, 16#00#, 16#78#, 16#00#, 16#3F#, 16#FF#, 16#E0#, 16#00#,
16#3F#, 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#FF#,
16#FF#, 16#F8#, 16#01#, 16#FF#, 16#FF#, 16#F8#, 16#00#, 16#18#, 16#00#,
16#18#, 16#00#, 16#18#, 16#00#, 16#30#, 16#00#, 16#30#, 16#00#, 16#30#,
16#00#, 16#30#, 16#00#, 16#30#, 16#00#, 16#30#, 16#00#, 16#30#, 16#00#,
16#30#, 16#00#, 16#00#, 16#00#, 16#20#, 16#30#, 16#00#, 16#00#, 16#60#,
16#30#, 16#00#, 16#00#, 16#60#, 16#30#, 16#00#, 16#00#, 16#7F#, 16#F0#,
16#00#, 16#00#, 16#7F#, 16#E0#, 16#00#, 16#00#, 16#40#, 16#60#, 16#00#,
16#00#, 16#C0#, 16#60#, 16#00#, 16#00#, 16#C0#, 16#60#, 16#00#, 16#00#,
16#C0#, 16#00#, 16#00#, 16#00#, 16#C0#, 16#00#, 16#00#, 16#01#, 16#80#,
16#00#, 16#C0#, 16#01#, 16#80#, 16#00#, 16#C0#, 16#01#, 16#80#, 16#00#,
16#C0#, 16#01#, 16#80#, 16#01#, 16#80#, 16#01#, 16#00#, 16#01#, 16#80#,
16#03#, 16#00#, 16#01#, 16#80#, 16#3F#, 16#FF#, 16#FF#, 16#80#, 16#3F#,
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#FF#, 16#FF#,
16#FC#, 16#01#, 16#FF#, 16#FF#, 16#FC#, 16#00#, 16#18#, 16#00#, 16#0C#,
16#00#, 16#18#, 16#00#, 16#18#, 16#00#, 16#30#, 16#00#, 16#18#, 16#00#,
16#30#, 16#00#, 16#18#, 16#00#, 16#30#, 16#00#, 16#18#, 16#00#, 16#30#,
16#00#, 16#00#, 16#00#, 16#20#, 16#30#, 16#00#, 16#00#, 16#60#, 16#30#,
16#00#, 16#00#, 16#60#, 16#30#, 16#00#, 16#00#, 16#7F#, 16#F0#, 16#00#,
16#00#, 16#7F#, 16#E0#, 16#00#, 16#00#, 16#40#, 16#60#, 16#00#, 16#00#,
16#C0#, 16#60#, 16#00#, 16#00#, 16#C0#, 16#60#, 16#00#, 16#00#, 16#C0#,
16#00#, 16#00#, 16#00#, 16#C0#, 16#00#, 16#00#, 16#01#, 16#80#, 16#00#,
16#00#, 16#01#, 16#80#, 16#00#, 16#00#, 16#01#, 16#80#, 16#00#, 16#00#,
16#01#, 16#80#, 16#00#, 16#00#, 16#01#, 16#00#, 16#00#, 16#00#, 16#03#,
16#00#, 16#00#, 16#00#, 16#3F#, 16#FF#, 16#00#, 16#00#, 16#3F#, 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#7F#, 16#00#, 16#00#, 16#03#, 16#FF#, 16#CC#,
16#00#, 16#07#, 16#81#, 16#FC#, 16#00#, 16#1E#, 16#00#, 16#38#, 16#00#,
16#38#, 16#00#, 16#18#, 16#00#, 16#70#, 16#00#, 16#18#, 16#00#, 16#60#,
16#00#, 16#18#, 16#00#, 16#C0#, 16#00#, 16#00#, 16#01#, 16#80#, 16#00#,
16#00#, 16#01#, 16#80#, 16#00#, 16#00#, 16#01#, 16#80#, 16#00#, 16#00#,
16#03#, 16#00#, 16#00#, 16#00#, 16#03#, 16#00#, 16#00#, 16#00#, 16#03#,
16#00#, 16#00#, 16#00#, 16#03#, 16#00#, 16#00#, 16#00#, 16#06#, 16#00#,
16#7F#, 16#F8#, 16#06#, 16#00#, 16#7F#, 16#F8#, 16#06#, 16#00#, 16#00#,
16#40#, 16#06#, 16#00#, 16#00#, 16#C0#, 16#06#, 16#00#, 16#00#, 16#C0#,
16#06#, 16#00#, 16#00#, 16#C0#, 16#07#, 16#00#, 16#00#, 16#C0#, 16#03#,
16#00#, 16#01#, 16#80#, 16#03#, 16#80#, 16#01#, 16#80#, 16#01#, 16#C0#,
16#03#, 16#80#, 16#00#, 16#F0#, 16#0F#, 16#80#, 16#00#, 16#7F#, 16#FC#,
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#7F#, 16#83#, 16#FC#, 16#00#,
16#7F#, 16#83#, 16#FC#, 16#00#, 16#18#, 16#00#, 16#30#, 16#00#, 16#18#,
16#00#, 16#60#, 16#00#, 16#18#, 16#00#, 16#60#, 16#00#, 16#30#, 16#00#,
16#60#, 16#00#, 16#30#, 16#00#, 16#60#, 16#00#, 16#30#, 16#00#, 16#E0#,
16#00#, 16#30#, 16#00#, 16#C0#, 16#00#, 16#60#, 16#00#, 16#C0#, 16#00#,
16#60#, 16#00#, 16#C0#, 16#00#, 16#7F#, 16#FF#, 16#C0#, 16#00#, 16#7F#,
16#FF#, 16#80#, 16#00#, 16#40#, 16#01#, 16#80#, 16#00#, 16#C0#, 16#01#,
16#80#, 16#00#, 16#C0#, 16#01#, 16#80#, 16#00#, 16#C0#, 16#01#, 16#80#,
16#00#, 16#C0#, 16#03#, 16#00#, 16#00#, 16#80#, 16#03#, 16#00#, 16#01#,
16#80#, 16#03#, 16#00#, 16#01#, 16#80#, 16#03#, 16#00#, 16#01#, 16#80#,
16#06#, 16#00#, 16#01#, 16#80#, 16#06#, 16#00#, 16#03#, 16#00#, 16#06#,
16#00#, 16#1F#, 16#F0#, 16#7F#, 16#C0#, 16#1F#, 16#F0#, 16#7F#, 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#1F#, 16#FF#, 16#F0#, 16#00#, 16#1F#,
16#FF#, 16#F0#, 16#00#, 16#00#, 16#30#, 16#00#, 16#00#, 16#00#, 16#30#,
16#00#, 16#00#, 16#00#, 16#30#, 16#00#, 16#00#, 16#00#, 16#30#, 16#00#,
16#00#, 16#00#, 16#60#, 16#00#, 16#00#, 16#00#, 16#60#, 16#00#, 16#00#,
16#00#, 16#60#, 16#00#, 16#00#, 16#00#, 16#60#, 16#00#, 16#00#, 16#00#,
16#C0#, 16#00#, 16#00#, 16#00#, 16#C0#, 16#00#, 16#00#, 16#00#, 16#C0#,
16#00#, 16#00#, 16#00#, 16#C0#, 16#00#, 16#00#, 16#00#, 16#C0#, 16#00#,
16#00#, 16#01#, 16#80#, 16#00#, 16#00#, 16#01#, 16#80#, 16#00#, 16#00#,
16#01#, 16#80#, 16#00#, 16#00#, 16#01#, 16#80#, 16#00#, 16#00#, 16#03#,
16#00#, 16#00#, 16#00#, 16#03#, 16#00#, 16#00#, 16#00#, 16#03#, 16#00#,
16#00#, 16#00#, 16#03#, 16#00#, 16#00#, 16#00#, 16#03#, 16#00#, 16#00#,
16#03#, 16#FF#, 16#FE#, 16#00#, 16#03#, 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#7F#, 16#FF#, 16#00#, 16#00#, 16#FF#,
16#FF#, 16#00#, 16#00#, 16#00#, 16#60#, 16#00#, 16#00#, 16#00#, 16#60#,
16#00#, 16#00#, 16#00#, 16#C0#, 16#00#, 16#00#, 16#00#, 16#C0#, 16#00#,
16#00#, 16#00#, 16#C0#, 16#00#, 16#00#, 16#00#, 16#C0#, 16#00#, 16#00#,
16#01#, 16#80#, 16#00#, 16#00#, 16#01#, 16#80#, 16#00#, 16#00#, 16#01#,
16#80#, 16#00#, 16#00#, 16#01#, 16#80#, 16#00#, 16#00#, 16#01#, 16#80#,
16#00#, 16#00#, 16#03#, 16#00#, 16#01#, 16#00#, 16#03#, 16#00#, 16#03#,
16#00#, 16#03#, 16#00#, 16#03#, 16#00#, 16#03#, 16#00#, 16#03#, 16#00#,
16#02#, 16#00#, 16#03#, 16#00#, 16#06#, 16#00#, 16#06#, 16#00#, 16#06#,
16#00#, 16#06#, 16#00#, 16#0E#, 16#00#, 16#06#, 16#00#, 16#0C#, 16#00#,
16#07#, 16#00#, 16#18#, 16#00#, 16#03#, 16#80#, 16#30#, 16#00#, 16#01#,
16#C0#, 16#E0#, 16#00#, 16#00#, 16#FF#, 16#C0#, 16#00#, 16#00#, 16#3F#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#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#C1#, 16#FE#, 16#01#, 16#FF#, 16#C1#, 16#FE#,
16#00#, 16#18#, 16#00#, 16#70#, 16#00#, 16#18#, 16#00#, 16#E0#, 16#00#,
16#30#, 16#01#, 16#80#, 16#00#, 16#30#, 16#07#, 16#00#, 16#00#, 16#30#,
16#0E#, 16#00#, 16#00#, 16#30#, 16#18#, 16#00#, 16#00#, 16#30#, 16#70#,
16#00#, 16#00#, 16#60#, 16#E0#, 16#00#, 16#00#, 16#63#, 16#80#, 16#00#,
16#00#, 16#67#, 16#80#, 16#00#, 16#00#, 16#6D#, 16#E0#, 16#00#, 16#00#,
16#78#, 16#70#, 16#00#, 16#00#, 16#F0#, 16#38#, 16#00#, 16#00#, 16#C0#,
16#18#, 16#00#, 16#00#, 16#C0#, 16#1C#, 16#00#, 16#00#, 16#C0#, 16#0C#,
16#00#, 16#01#, 16#80#, 16#0C#, 16#00#, 16#01#, 16#80#, 16#0C#, 16#00#,
16#01#, 16#80#, 16#0E#, 16#00#, 16#01#, 16#80#, 16#06#, 16#00#, 16#01#,
16#80#, 16#06#, 16#00#, 16#03#, 16#00#, 16#06#, 16#00#, 16#3F#, 16#F8#,
16#07#, 16#E0#, 16#3F#, 16#F0#, 16#07#, 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#7F#, 16#FC#, 16#00#, 16#00#, 16#FF#, 16#FC#, 16#00#, 16#00#,
16#03#, 16#00#, 16#00#, 16#00#, 16#03#, 16#00#, 16#00#, 16#00#, 16#06#,
16#00#, 16#00#, 16#00#, 16#06#, 16#00#, 16#00#, 16#00#, 16#06#, 16#00#,
16#00#, 16#00#, 16#06#, 16#00#, 16#00#, 16#00#, 16#04#, 16#00#, 16#00#,
16#00#, 16#0C#, 16#00#, 16#00#, 16#00#, 16#0C#, 16#00#, 16#00#, 16#00#,
16#0C#, 16#00#, 16#00#, 16#00#, 16#0C#, 16#00#, 16#00#, 16#00#, 16#18#,
16#00#, 16#00#, 16#00#, 16#18#, 16#00#, 16#00#, 16#00#, 16#18#, 16#00#,
16#00#, 16#00#, 16#18#, 16#00#, 16#20#, 16#00#, 16#18#, 16#00#, 16#60#,
16#00#, 16#30#, 16#00#, 16#60#, 16#00#, 16#30#, 16#00#, 16#60#, 16#00#,
16#30#, 16#00#, 16#60#, 16#00#, 16#30#, 16#00#, 16#C0#, 16#00#, 16#60#,
16#00#, 16#C0#, 16#00#, 16#60#, 16#00#, 16#C0#, 16#1F#, 16#FF#, 16#FF#,
16#C0#, 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#01#,
16#F8#, 16#00#, 16#1F#, 16#03#, 16#F8#, 16#00#, 16#3F#, 16#00#, 16#D8#,
16#00#, 16#7C#, 16#00#, 16#D8#, 16#00#, 16#6C#, 16#00#, 16#CC#, 16#00#,
16#CC#, 16#00#, 16#CC#, 16#01#, 16#C8#, 16#00#, 16#CC#, 16#01#, 16#98#,
16#01#, 16#8C#, 16#03#, 16#18#, 16#01#, 16#86#, 16#07#, 16#18#, 16#01#,
16#86#, 16#06#, 16#18#, 16#01#, 16#86#, 16#0C#, 16#30#, 16#01#, 16#06#,
16#1C#, 16#30#, 16#03#, 16#07#, 16#18#, 16#30#, 16#03#, 16#03#, 16#30#,
16#30#, 16#03#, 16#03#, 16#60#, 16#30#, 16#03#, 16#03#, 16#60#, 16#60#,
16#06#, 16#03#, 16#C0#, 16#60#, 16#06#, 16#01#, 16#80#, 16#60#, 16#06#,
16#00#, 16#00#, 16#60#, 16#06#, 16#00#, 16#00#, 16#C0#, 16#06#, 16#00#,
16#00#, 16#C0#, 16#0C#, 16#00#, 16#00#, 16#C0#, 16#0C#, 16#00#, 16#00#,
16#C0#, 16#0C#, 16#00#, 16#00#, 16#C0#, 16#7F#, 16#C0#, 16#1F#, 16#F0#,
16#7F#, 16#C0#, 16#1F#, 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#01#, 16#F8#,
16#03#, 16#FF#, 16#03#, 16#FC#, 16#03#, 16#FF#, 16#00#, 16#3C#, 16#00#,
16#18#, 16#00#, 16#3C#, 16#00#, 16#30#, 16#00#, 16#26#, 16#00#, 16#30#,
16#00#, 16#66#, 16#00#, 16#30#, 16#00#, 16#67#, 16#00#, 16#30#, 16#00#,
16#63#, 16#00#, 16#30#, 16#00#, 16#43#, 16#00#, 16#60#, 16#00#, 16#C1#,
16#80#, 16#60#, 16#00#, 16#C1#, 16#80#, 16#60#, 16#00#, 16#C1#, 16#C0#,
16#60#, 16#00#, 16#C0#, 16#C0#, 16#40#, 16#00#, 16#80#, 16#C0#, 16#C0#,
16#01#, 16#80#, 16#60#, 16#C0#, 16#01#, 16#80#, 16#60#, 16#C0#, 16#01#,
16#80#, 16#70#, 16#C0#, 16#01#, 16#80#, 16#31#, 16#80#, 16#03#, 16#00#,
16#31#, 16#80#, 16#03#, 16#00#, 16#19#, 16#80#, 16#03#, 16#00#, 16#19#,
16#80#, 16#03#, 16#00#, 16#1D#, 16#80#, 16#03#, 16#00#, 16#0F#, 16#00#,
16#06#, 16#00#, 16#0F#, 16#00#, 16#3F#, 16#F0#, 16#07#, 16#00#, 16#3F#,
16#F0#, 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#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#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#03#, 16#FF#,
16#80#, 16#00#, 16#07#, 16#83#, 16#C0#, 16#00#, 16#1C#, 16#00#, 16#E0#,
16#00#, 16#38#, 16#00#, 16#70#, 16#00#, 16#70#, 16#00#, 16#30#, 16#00#,
16#E0#, 16#00#, 16#30#, 16#00#, 16#C0#, 16#00#, 16#38#, 16#01#, 16#80#,
16#00#, 16#18#, 16#01#, 16#80#, 16#00#, 16#18#, 16#03#, 16#00#, 16#00#,
16#18#, 16#03#, 16#00#, 16#00#, 16#18#, 16#02#, 16#00#, 16#00#, 16#18#,
16#06#, 16#00#, 16#00#, 16#18#, 16#06#, 16#00#, 16#00#, 16#10#, 16#06#,
16#00#, 16#00#, 16#30#, 16#06#, 16#00#, 16#00#, 16#30#, 16#06#, 16#00#,
16#00#, 16#20#, 16#06#, 16#00#, 16#00#, 16#60#, 16#06#, 16#00#, 16#00#,
16#E0#, 16#06#, 16#00#, 16#00#, 16#C0#, 16#07#, 16#00#, 16#01#, 16#80#,
16#03#, 16#00#, 16#03#, 16#00#, 16#03#, 16#80#, 16#07#, 16#00#, 16#01#,
16#C0#, 16#1E#, 16#00#, 16#00#, 16#F0#, 16#78#, 16#00#, 16#00#, 16#7F#,
16#F0#, 16#00#, 16#00#, 16#1F#, 16#80#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#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#FE#, 16#00#,
16#01#, 16#FF#, 16#FF#, 16#80#, 16#00#, 16#18#, 16#01#, 16#C0#, 16#00#,
16#18#, 16#00#, 16#E0#, 16#00#, 16#30#, 16#00#, 16#60#, 16#00#, 16#30#,
16#00#, 16#70#, 16#00#, 16#30#, 16#00#, 16#30#, 16#00#, 16#30#, 16#00#,
16#60#, 16#00#, 16#30#, 16#00#, 16#60#, 16#00#, 16#60#, 16#00#, 16#E0#,
16#00#, 16#60#, 16#00#, 16#C0#, 16#00#, 16#60#, 16#03#, 16#80#, 16#00#,
16#60#, 16#0F#, 16#00#, 16#00#, 16#7F#, 16#FC#, 16#00#, 16#00#, 16#FF#,
16#F0#, 16#00#, 16#00#, 16#C0#, 16#00#, 16#00#, 16#00#, 16#C0#, 16#00#,
16#00#, 16#00#, 16#C0#, 16#00#, 16#00#, 16#01#, 16#80#, 16#00#, 16#00#,
16#01#, 16#80#, 16#00#, 16#00#, 16#01#, 16#80#, 16#00#, 16#00#, 16#01#,
16#80#, 16#00#, 16#00#, 16#01#, 16#00#, 16#00#, 16#00#, 16#03#, 16#00#,
16#00#, 16#00#, 16#3F#, 16#FF#, 16#00#, 16#00#, 16#3F#, 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#FE#, 16#00#, 16#00#, 16#03#, 16#FF#, 16#80#, 16#00#,
16#0F#, 16#83#, 16#C0#, 16#00#, 16#1C#, 16#00#, 16#E0#, 16#00#, 16#38#,
16#00#, 16#70#, 16#00#, 16#70#, 16#00#, 16#30#, 16#00#, 16#60#, 16#00#,
16#30#, 16#00#, 16#C0#, 16#00#, 16#38#, 16#01#, 16#80#, 16#00#, 16#18#,
16#01#, 16#80#, 16#00#, 16#18#, 16#03#, 16#00#, 16#00#, 16#18#, 16#03#,
16#00#, 16#00#, 16#18#, 16#06#, 16#00#, 16#00#, 16#18#, 16#06#, 16#00#,
16#00#, 16#18#, 16#06#, 16#00#, 16#00#, 16#18#, 16#06#, 16#00#, 16#00#,
16#30#, 16#06#, 16#00#, 16#00#, 16#30#, 16#06#, 16#00#, 16#00#, 16#30#,
16#06#, 16#00#, 16#00#, 16#60#, 16#06#, 16#00#, 16#00#, 16#E0#, 16#06#,
16#00#, 16#00#, 16#C0#, 16#07#, 16#00#, 16#01#, 16#80#, 16#03#, 16#00#,
16#03#, 16#00#, 16#01#, 16#80#, 16#07#, 16#00#, 16#01#, 16#C0#, 16#1C#,
16#00#, 16#00#, 16#F0#, 16#78#, 16#00#, 16#00#, 16#3F#, 16#F0#, 16#00#,
16#00#, 16#1F#, 16#80#, 16#00#, 16#00#, 16#78#, 16#00#, 16#00#, 16#00#,
16#FF#, 16#C1#, 16#80#, 16#03#, 16#FF#, 16#FF#, 16#80#, 16#03#, 16#80#,
16#7C#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#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#FE#, 16#00#, 16#01#, 16#FF#,
16#FF#, 16#80#, 16#00#, 16#18#, 16#01#, 16#C0#, 16#00#, 16#18#, 16#00#,
16#E0#, 16#00#, 16#30#, 16#00#, 16#60#, 16#00#, 16#30#, 16#00#, 16#70#,
16#00#, 16#30#, 16#00#, 16#30#, 16#00#, 16#30#, 16#00#, 16#20#, 16#00#,
16#30#, 16#00#, 16#60#, 16#00#, 16#60#, 16#00#, 16#E0#, 16#00#, 16#60#,
16#01#, 16#C0#, 16#00#, 16#60#, 16#03#, 16#80#, 16#00#, 16#60#, 16#0F#,
16#00#, 16#00#, 16#7F#, 16#FC#, 16#00#, 16#00#, 16#FF#, 16#E0#, 16#00#,
16#00#, 16#C0#, 16#78#, 16#00#, 16#00#, 16#C0#, 16#1C#, 16#00#, 16#00#,
16#C0#, 16#0C#, 16#00#, 16#01#, 16#80#, 16#0E#, 16#00#, 16#01#, 16#80#,
16#06#, 16#00#, 16#01#, 16#80#, 16#03#, 16#00#, 16#01#, 16#80#, 16#03#,
16#00#, 16#01#, 16#80#, 16#03#, 16#80#, 16#03#, 16#00#, 16#01#, 16#80#,
16#3F#, 16#F8#, 16#01#, 16#F0#, 16#3F#, 16#F0#, 16#00#, 16#F0#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#FE#, 16#00#, 16#00#, 16#03#, 16#FF#, 16#90#, 16#00#, 16#07#, 16#83#,
16#F0#, 16#00#, 16#0E#, 16#00#, 16#F0#, 16#00#, 16#18#, 16#00#, 16#70#,
16#00#, 16#30#, 16#00#, 16#60#, 16#00#, 16#30#, 16#00#, 16#60#, 16#00#,
16#30#, 16#00#, 16#60#, 16#00#, 16#70#, 16#00#, 16#00#, 16#00#, 16#70#,
16#00#, 16#00#, 16#00#, 16#30#, 16#00#, 16#00#, 16#00#, 16#3C#, 16#00#,
16#00#, 16#00#, 16#1F#, 16#80#, 16#00#, 16#00#, 16#03#, 16#F8#, 16#00#,
16#00#, 16#00#, 16#1F#, 16#00#, 16#00#, 16#00#, 16#07#, 16#80#, 16#00#,
16#00#, 16#01#, 16#80#, 16#00#, 16#00#, 16#01#, 16#C0#, 16#00#, 16#00#,
16#01#, 16#C0#, 16#02#, 16#00#, 16#01#, 16#C0#, 16#03#, 16#00#, 16#01#,
16#80#, 16#07#, 16#00#, 16#01#, 16#80#, 16#07#, 16#00#, 16#03#, 16#80#,
16#07#, 16#00#, 16#07#, 16#00#, 16#07#, 16#80#, 16#0E#, 16#00#, 16#06#,
16#E0#, 16#3C#, 16#00#, 16#04#, 16#7F#, 16#F0#, 16#00#, 16#00#, 16#1F#,
16#80#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#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#FC#, 16#00#, 16#7F#, 16#FF#, 16#FC#,
16#00#, 16#C0#, 16#30#, 16#0C#, 16#00#, 16#C0#, 16#30#, 16#0C#, 16#00#,
16#C0#, 16#30#, 16#18#, 16#00#, 16#C0#, 16#30#, 16#18#, 16#00#, 16#80#,
16#60#, 16#08#, 16#00#, 16#00#, 16#60#, 16#00#, 16#00#, 16#00#, 16#60#,
16#00#, 16#00#, 16#00#, 16#60#, 16#00#, 16#00#, 16#00#, 16#40#, 16#00#,
16#00#, 16#00#, 16#C0#, 16#00#, 16#00#, 16#00#, 16#C0#, 16#00#, 16#00#,
16#00#, 16#C0#, 16#00#, 16#00#, 16#00#, 16#C0#, 16#00#, 16#00#, 16#01#,
16#80#, 16#00#, 16#00#, 16#01#, 16#80#, 16#00#, 16#00#, 16#01#, 16#80#,
16#00#, 16#00#, 16#01#, 16#80#, 16#00#, 16#00#, 16#01#, 16#80#, 16#00#,
16#00#, 16#03#, 16#00#, 16#00#, 16#00#, 16#03#, 16#00#, 16#00#, 16#00#,
16#03#, 16#00#, 16#00#, 16#00#, 16#03#, 16#00#, 16#00#, 16#01#, 16#FF#,
16#F8#, 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#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#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#83#, 16#FF#, 16#01#, 16#FF#, 16#83#, 16#FF#, 16#00#,
16#30#, 16#00#, 16#18#, 16#00#, 16#30#, 16#00#, 16#30#, 16#00#, 16#60#,
16#00#, 16#30#, 16#00#, 16#60#, 16#00#, 16#30#, 16#00#, 16#60#, 16#00#,
16#30#, 16#00#, 16#60#, 16#00#, 16#20#, 16#00#, 16#60#, 16#00#, 16#60#,
16#00#, 16#C0#, 16#00#, 16#60#, 16#00#, 16#C0#, 16#00#, 16#60#, 16#00#,
16#C0#, 16#00#, 16#60#, 16#00#, 16#C0#, 16#00#, 16#C0#, 16#01#, 16#80#,
16#00#, 16#C0#, 16#01#, 16#80#, 16#00#, 16#C0#, 16#01#, 16#80#, 16#00#,
16#C0#, 16#01#, 16#80#, 16#00#, 16#C0#, 16#01#, 16#80#, 16#01#, 16#80#,
16#03#, 16#00#, 16#01#, 16#80#, 16#03#, 16#00#, 16#01#, 16#80#, 16#03#,
16#00#, 16#03#, 16#00#, 16#01#, 16#80#, 16#07#, 16#00#, 16#01#, 16#80#,
16#0E#, 16#00#, 16#01#, 16#C0#, 16#1C#, 16#00#, 16#00#, 16#F0#, 16#78#,
16#00#, 16#00#, 16#7F#, 16#E0#, 16#00#, 16#00#, 16#1F#, 16#80#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#03#,
16#FE#, 16#00#, 16#FF#, 16#03#, 16#FE#, 16#00#, 16#FF#, 16#00#, 16#E0#,
16#00#, 16#0C#, 16#00#, 16#60#, 16#00#, 16#18#, 16#00#, 16#60#, 16#00#,
16#18#, 16#00#, 16#60#, 16#00#, 16#30#, 16#00#, 16#60#, 16#00#, 16#20#,
16#00#, 16#60#, 16#00#, 16#60#, 16#00#, 16#30#, 16#00#, 16#C0#, 16#00#,
16#30#, 16#00#, 16#C0#, 16#00#, 16#30#, 16#01#, 16#80#, 16#00#, 16#30#,
16#03#, 16#00#, 16#00#, 16#30#, 16#03#, 16#00#, 16#00#, 16#30#, 16#06#,
16#00#, 16#00#, 16#18#, 16#0C#, 16#00#, 16#00#, 16#18#, 16#0C#, 16#00#,
16#00#, 16#18#, 16#18#, 16#00#, 16#00#, 16#18#, 16#18#, 16#00#, 16#00#,
16#18#, 16#30#, 16#00#, 16#00#, 16#1C#, 16#60#, 16#00#, 16#00#, 16#0C#,
16#60#, 16#00#, 16#00#, 16#0C#, 16#C0#, 16#00#, 16#00#, 16#0D#, 16#80#,
16#00#, 16#00#, 16#0D#, 16#80#, 16#00#, 16#00#, 16#0F#, 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#01#, 16#FF#,
16#01#, 16#FF#, 16#03#, 16#FF#, 16#01#, 16#FF#, 16#00#, 16#C0#, 16#00#,
16#0C#, 16#00#, 16#C0#, 16#00#, 16#0C#, 16#00#, 16#C0#, 16#00#, 16#0C#,
16#00#, 16#C0#, 16#10#, 16#18#, 16#00#, 16#C0#, 16#70#, 16#18#, 16#00#,
16#C0#, 16#F0#, 16#18#, 16#01#, 16#80#, 16#B0#, 16#30#, 16#01#, 16#81#,
16#B0#, 16#30#, 16#01#, 16#81#, 16#30#, 16#30#, 16#01#, 16#83#, 16#30#,
16#60#, 16#01#, 16#82#, 16#30#, 16#60#, 16#01#, 16#86#, 16#18#, 16#60#,
16#01#, 16#84#, 16#18#, 16#C0#, 16#01#, 16#8C#, 16#18#, 16#C0#, 16#01#,
16#88#, 16#18#, 16#C0#, 16#01#, 16#98#, 16#19#, 16#80#, 16#03#, 16#10#,
16#19#, 16#80#, 16#03#, 16#30#, 16#19#, 16#80#, 16#03#, 16#20#, 16#1B#,
16#00#, 16#03#, 16#60#, 16#1B#, 16#00#, 16#03#, 16#40#, 16#1B#, 16#00#,
16#03#, 16#C0#, 16#1E#, 16#00#, 16#03#, 16#80#, 16#1E#, 16#00#, 16#03#,
16#80#, 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#FE#, 16#00#,
16#FE#, 16#00#, 16#FE#, 16#01#, 16#FE#, 16#00#, 16#30#, 16#00#, 16#30#,
16#00#, 16#38#, 16#00#, 16#60#, 16#00#, 16#18#, 16#00#, 16#C0#, 16#00#,
16#0C#, 16#01#, 16#80#, 16#00#, 16#0E#, 16#03#, 16#00#, 16#00#, 16#06#,
16#06#, 16#00#, 16#00#, 16#07#, 16#0C#, 16#00#, 16#00#, 16#03#, 16#18#,
16#00#, 16#00#, 16#03#, 16#B0#, 16#00#, 16#00#, 16#01#, 16#E0#, 16#00#,
16#00#, 16#00#, 16#C0#, 16#00#, 16#00#, 16#01#, 16#E0#, 16#00#, 16#00#,
16#03#, 16#60#, 16#00#, 16#00#, 16#06#, 16#70#, 16#00#, 16#00#, 16#0C#,
16#30#, 16#00#, 16#00#, 16#18#, 16#38#, 16#00#, 16#00#, 16#30#, 16#18#,
16#00#, 16#00#, 16#60#, 16#0C#, 16#00#, 16#00#, 16#C0#, 16#0E#, 16#00#,
16#01#, 16#80#, 16#06#, 16#00#, 16#03#, 16#00#, 16#07#, 16#00#, 16#06#,
16#00#, 16#03#, 16#00#, 16#3F#, 16#E0#, 16#3F#, 16#C0#, 16#3F#, 16#E0#,
16#3F#, 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#FF#, 16#00#, 16#FE#,
16#00#, 16#FE#, 16#00#, 16#FE#, 16#00#, 16#38#, 16#00#, 16#30#, 16#00#,
16#18#, 16#00#, 16#60#, 16#00#, 16#18#, 16#00#, 16#C0#, 16#00#, 16#0C#,
16#01#, 16#80#, 16#00#, 16#0C#, 16#03#, 16#80#, 16#00#, 16#06#, 16#03#,
16#00#, 16#00#, 16#06#, 16#06#, 16#00#, 16#00#, 16#03#, 16#0C#, 16#00#,
16#00#, 16#03#, 16#18#, 16#00#, 16#00#, 16#01#, 16#B0#, 16#00#, 16#00#,
16#01#, 16#E0#, 16#00#, 16#00#, 16#01#, 16#C0#, 16#00#, 16#00#, 16#00#,
16#C0#, 16#00#, 16#00#, 16#01#, 16#80#, 16#00#, 16#00#, 16#01#, 16#80#,
16#00#, 16#00#, 16#01#, 16#80#, 16#00#, 16#00#, 16#01#, 16#80#, 16#00#,
16#00#, 16#01#, 16#80#, 16#00#, 16#00#, 16#03#, 16#00#, 16#00#, 16#00#,
16#03#, 16#00#, 16#00#, 16#00#, 16#03#, 16#00#, 16#00#, 16#00#, 16#03#,
16#00#, 16#00#, 16#01#, 16#FF#, 16#FC#, 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#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#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#FF#, 16#F0#, 16#00#,
16#1F#, 16#FF#, 16#E0#, 16#00#, 16#18#, 16#00#, 16#60#, 16#00#, 16#18#,
16#00#, 16#C0#, 16#00#, 16#30#, 16#01#, 16#C0#, 16#00#, 16#30#, 16#03#,
16#80#, 16#00#, 16#30#, 16#07#, 16#00#, 16#00#, 16#20#, 16#0E#, 16#00#,
16#00#, 16#00#, 16#1C#, 16#00#, 16#00#, 16#00#, 16#38#, 16#00#, 16#00#,
16#00#, 16#70#, 16#00#, 16#00#, 16#00#, 16#60#, 16#00#, 16#00#, 16#00#,
16#C0#, 16#00#, 16#00#, 16#01#, 16#80#, 16#00#, 16#00#, 16#03#, 16#00#,
16#00#, 16#00#, 16#06#, 16#00#, 16#00#, 16#00#, 16#0C#, 16#00#, 16#00#,
16#00#, 16#18#, 16#01#, 16#80#, 16#00#, 16#30#, 16#01#, 16#80#, 16#00#,
16#60#, 16#01#, 16#80#, 16#00#, 16#C0#, 16#01#, 16#80#, 16#01#, 16#80#,
16#03#, 16#00#, 16#03#, 16#00#, 16#03#, 16#00#, 16#06#, 16#00#, 16#03#,
16#00#, 16#07#, 16#FF#, 16#FF#, 16#00#, 16#07#, 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#1F#, 16#E0#, 16#00#,
16#00#, 16#1F#, 16#E0#, 16#00#, 16#00#, 16#18#, 16#00#, 16#00#, 16#00#,
16#30#, 16#00#, 16#00#, 16#00#, 16#30#, 16#00#, 16#00#, 16#00#, 16#30#,
16#00#, 16#00#, 16#00#, 16#30#, 16#00#, 16#00#, 16#00#, 16#30#, 16#00#,
16#00#, 16#00#, 16#60#, 16#00#, 16#00#, 16#00#, 16#60#, 16#00#, 16#00#,
16#00#, 16#60#, 16#00#, 16#00#, 16#00#, 16#60#, 16#00#, 16#00#, 16#00#,
16#40#, 16#00#, 16#00#, 16#00#, 16#C0#, 16#00#, 16#00#, 16#00#, 16#C0#,
16#00#, 16#00#, 16#00#, 16#C0#, 16#00#, 16#00#, 16#00#, 16#C0#, 16#00#,
16#00#, 16#01#, 16#80#, 16#00#, 16#00#, 16#01#, 16#80#, 16#00#, 16#00#,
16#01#, 16#80#, 16#00#, 16#00#, 16#01#, 16#80#, 16#00#, 16#00#, 16#01#,
16#80#, 16#00#, 16#00#, 16#03#, 16#00#, 16#00#, 16#00#, 16#03#, 16#00#,
16#00#, 16#00#, 16#03#, 16#00#, 16#00#, 16#00#, 16#03#, 16#00#, 16#00#,
16#00#, 16#02#, 16#00#, 16#00#, 16#00#, 16#06#, 16#00#, 16#00#, 16#00#,
16#06#, 16#00#, 16#00#, 16#00#, 16#06#, 16#00#, 16#00#, 16#00#, 16#06#,
16#00#, 16#00#, 16#00#, 16#0C#, 16#00#, 16#00#, 16#00#, 16#0F#, 16#F0#,
16#00#, 16#00#, 16#0F#, 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#0C#, 16#00#, 16#00#, 16#00#, 16#0C#, 16#00#, 16#00#, 16#00#,
16#0C#, 16#00#, 16#00#, 16#00#, 16#0E#, 16#00#, 16#00#, 16#00#, 16#06#,
16#00#, 16#00#, 16#00#, 16#06#, 16#00#, 16#00#, 16#00#, 16#06#, 16#00#,
16#00#, 16#00#, 16#07#, 16#00#, 16#00#, 16#00#, 16#03#, 16#00#, 16#00#,
16#00#, 16#03#, 16#00#, 16#00#, 16#00#, 16#03#, 16#00#, 16#00#, 16#00#,
16#03#, 16#80#, 16#00#, 16#00#, 16#01#, 16#80#, 16#00#, 16#00#, 16#01#,
16#80#, 16#00#, 16#00#, 16#01#, 16#80#, 16#00#, 16#00#, 16#00#, 16#C0#,
16#00#, 16#00#, 16#00#, 16#C0#, 16#00#, 16#00#, 16#00#, 16#C0#, 16#00#,
16#00#, 16#00#, 16#C0#, 16#00#, 16#00#, 16#00#, 16#60#, 16#00#, 16#00#,
16#00#, 16#60#, 16#00#, 16#00#, 16#00#, 16#60#, 16#00#, 16#00#, 16#00#,
16#60#, 16#00#, 16#00#, 16#00#, 16#30#, 16#00#, 16#00#, 16#00#, 16#30#,
16#00#, 16#00#, 16#00#, 16#30#, 16#00#, 16#00#, 16#00#, 16#30#, 16#00#,
16#00#, 16#00#, 16#18#, 16#00#, 16#00#, 16#00#, 16#18#, 16#00#, 16#00#,
16#00#, 16#18#, 16#00#, 16#00#, 16#00#, 16#18#, 16#00#, 16#00#, 16#00#,
16#0C#, 16#00#, 16#00#, 16#00#, 16#0C#, 16#00#, 16#00#, 16#00#, 16#0C#,
16#00#, 16#00#, 16#00#, 16#0C#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#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#F8#, 16#00#, 16#00#, 16#07#, 16#F8#,
16#00#, 16#00#, 16#00#, 16#18#, 16#00#, 16#00#, 16#00#, 16#30#, 16#00#,
16#00#, 16#00#, 16#30#, 16#00#, 16#00#, 16#00#, 16#30#, 16#00#, 16#00#,
16#00#, 16#30#, 16#00#, 16#00#, 16#00#, 16#30#, 16#00#, 16#00#, 16#00#,
16#60#, 16#00#, 16#00#, 16#00#, 16#60#, 16#00#, 16#00#, 16#00#, 16#60#,
16#00#, 16#00#, 16#00#, 16#60#, 16#00#, 16#00#, 16#00#, 16#C0#, 16#00#,
16#00#, 16#00#, 16#C0#, 16#00#, 16#00#, 16#00#, 16#C0#, 16#00#, 16#00#,
16#00#, 16#C0#, 16#00#, 16#00#, 16#00#, 16#C0#, 16#00#, 16#00#, 16#01#,
16#80#, 16#00#, 16#00#, 16#01#, 16#80#, 16#00#, 16#00#, 16#01#, 16#80#,
16#00#, 16#00#, 16#01#, 16#80#, 16#00#, 16#00#, 16#01#, 16#80#, 16#00#,
16#00#, 16#03#, 16#00#, 16#00#, 16#00#, 16#03#, 16#00#, 16#00#, 16#00#,
16#03#, 16#00#, 16#00#, 16#00#, 16#03#, 16#00#, 16#00#, 16#00#, 16#06#,
16#00#, 16#00#, 16#00#, 16#06#, 16#00#, 16#00#, 16#00#, 16#06#, 16#00#,
16#00#, 16#00#, 16#06#, 16#00#, 16#00#, 16#00#, 16#06#, 16#00#, 16#00#,
16#00#, 16#0C#, 16#00#, 16#00#, 16#03#, 16#FC#, 16#00#, 16#00#, 16#03#,
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#08#,
16#00#, 16#00#, 16#00#, 16#18#, 16#00#, 16#00#, 16#00#, 16#3C#, 16#00#,
16#00#, 16#00#, 16#6C#, 16#00#, 16#00#, 16#00#, 16#C6#, 16#00#, 16#00#,
16#01#, 16#87#, 16#00#, 16#00#, 16#07#, 16#03#, 16#00#, 16#00#, 16#0E#,
16#03#, 16#80#, 16#00#, 16#1C#, 16#01#, 16#80#, 16#00#, 16#38#, 16#00#,
16#C0#, 16#00#, 16#70#, 16#00#, 16#E0#, 16#00#, 16#60#, 16#00#, 16#40#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#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#FF#, 16#FF#, 16#E0#, 16#FF#, 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#06#, 16#00#, 16#00#, 16#00#, 16#07#, 16#00#, 16#00#, 16#00#,
16#07#, 16#00#, 16#00#, 16#00#, 16#03#, 16#80#, 16#00#, 16#00#, 16#01#,
16#C0#, 16#00#, 16#00#, 16#00#, 16#E0#, 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#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#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#3F#, 16#FE#, 16#00#, 16#00#, 16#38#,
16#0F#, 16#00#, 16#00#, 16#00#, 16#03#, 16#80#, 16#00#, 16#00#, 16#01#,
16#80#, 16#00#, 16#00#, 16#01#, 16#80#, 16#00#, 16#00#, 16#01#, 16#80#,
16#00#, 16#00#, 16#01#, 16#80#, 16#00#, 16#00#, 16#03#, 16#00#, 16#00#,
16#0F#, 16#F3#, 16#00#, 16#00#, 16#7F#, 16#FF#, 16#00#, 16#01#, 16#F0#,
16#03#, 16#00#, 16#03#, 16#80#, 16#07#, 16#00#, 16#07#, 16#00#, 16#06#,
16#00#, 16#06#, 16#00#, 16#06#, 16#00#, 16#04#, 16#00#, 16#06#, 16#00#,
16#0C#, 16#00#, 16#0E#, 16#00#, 16#0C#, 16#00#, 16#3C#, 16#00#, 16#06#,
16#00#, 16#7C#, 16#00#, 16#07#, 16#03#, 16#CF#, 16#C0#, 16#03#, 16#FF#,
16#0F#, 16#C0#, 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#01#, 16#F8#, 16#00#,
16#00#, 16#01#, 16#F0#, 16#00#, 16#00#, 16#00#, 16#30#, 16#00#, 16#00#,
16#00#, 16#30#, 16#00#, 16#00#, 16#00#, 16#30#, 16#00#, 16#00#, 16#00#,
16#30#, 16#00#, 16#00#, 16#00#, 16#60#, 16#00#, 16#00#, 16#00#, 16#60#,
16#7C#, 16#00#, 16#00#, 16#61#, 16#FF#, 16#00#, 16#00#, 16#67#, 16#03#,
16#C0#, 16#00#, 16#6C#, 16#01#, 16#C0#, 16#00#, 16#D8#, 16#00#, 16#E0#,
16#00#, 16#F0#, 16#00#, 16#60#, 16#00#, 16#E0#, 16#00#, 16#70#, 16#00#,
16#C0#, 16#00#, 16#30#, 16#00#, 16#C0#, 16#00#, 16#30#, 16#01#, 16#80#,
16#00#, 16#30#, 16#01#, 16#80#, 16#00#, 16#30#, 16#01#, 16#80#, 16#00#,
16#60#, 16#01#, 16#80#, 16#00#, 16#60#, 16#03#, 16#80#, 16#00#, 16#60#,
16#03#, 16#80#, 16#00#, 16#C0#, 16#03#, 16#80#, 16#00#, 16#C0#, 16#03#,
16#80#, 16#01#, 16#80#, 16#03#, 16#C0#, 16#03#, 16#00#, 16#06#, 16#E0#,
16#0E#, 16#00#, 16#7E#, 16#78#, 16#3C#, 16#00#, 16#7E#, 16#3F#, 16#F8#,
16#00#, 16#00#, 16#0F#, 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#01#, 16#FC#,
16#00#, 16#00#, 16#07#, 16#FF#, 16#30#, 16#00#, 16#1E#, 16#07#, 16#F0#,
16#00#, 16#38#, 16#01#, 16#F0#, 16#00#, 16#70#, 16#00#, 16#60#, 16#00#,
16#E0#, 16#00#, 16#60#, 16#00#, 16#C0#, 16#00#, 16#60#, 16#01#, 16#80#,
16#00#, 16#60#, 16#01#, 16#80#, 16#00#, 16#00#, 16#03#, 16#00#, 16#00#,
16#00#, 16#03#, 16#00#, 16#00#, 16#00#, 16#03#, 16#00#, 16#00#, 16#00#,
16#03#, 16#00#, 16#00#, 16#00#, 16#03#, 16#00#, 16#00#, 16#00#, 16#03#,
16#00#, 16#00#, 16#00#, 16#03#, 16#00#, 16#00#, 16#00#, 16#03#, 16#00#,
16#00#, 16#00#, 16#03#, 16#80#, 16#00#, 16#C0#, 16#01#, 16#C0#, 16#03#,
16#C0#, 16#00#, 16#F0#, 16#1F#, 16#00#, 16#00#, 16#7F#, 16#FC#, 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#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#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#00#,
16#00#, 16#00#, 16#F8#, 16#00#, 16#00#, 16#00#, 16#18#, 16#00#, 16#00#,
16#00#, 16#18#, 16#00#, 16#00#, 16#00#, 16#18#, 16#00#, 16#00#, 16#00#,
16#30#, 16#00#, 16#00#, 16#00#, 16#30#, 16#00#, 16#03#, 16#F0#, 16#30#,
16#00#, 16#0F#, 16#FC#, 16#30#, 16#00#, 16#3C#, 16#0E#, 16#30#, 16#00#,
16#70#, 16#03#, 16#60#, 16#00#, 16#E0#, 16#03#, 16#60#, 16#01#, 16#C0#,
16#01#, 16#E0#, 16#01#, 16#80#, 16#00#, 16#E0#, 16#03#, 16#00#, 16#00#,
16#C0#, 16#03#, 16#00#, 16#00#, 16#C0#, 16#06#, 16#00#, 16#00#, 16#C0#,
16#06#, 16#00#, 16#00#, 16#C0#, 16#06#, 16#00#, 16#00#, 16#C0#, 16#06#,
16#00#, 16#01#, 16#80#, 16#06#, 16#00#, 16#01#, 16#80#, 16#06#, 16#00#,
16#03#, 16#80#, 16#06#, 16#00#, 16#03#, 16#80#, 16#07#, 16#00#, 16#07#,
16#80#, 16#03#, 16#00#, 16#0F#, 16#00#, 16#03#, 16#80#, 16#1B#, 16#00#,
16#01#, 16#E0#, 16#F3#, 16#E0#, 16#00#, 16#FF#, 16#C3#, 16#E0#, 16#00#,
16#3F#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#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#0F#, 16#FE#, 16#00#, 16#00#, 16#3C#, 16#07#, 16#80#, 16#00#, 16#70#,
16#03#, 16#80#, 16#00#, 16#E0#, 16#00#, 16#C0#, 16#01#, 16#C0#, 16#00#,
16#C0#, 16#01#, 16#80#, 16#00#, 16#60#, 16#03#, 16#00#, 16#00#, 16#60#,
16#03#, 16#00#, 16#00#, 16#60#, 16#07#, 16#FF#, 16#FF#, 16#E0#, 16#07#,
16#FF#, 16#FF#, 16#E0#, 16#06#, 16#00#, 16#00#, 16#00#, 16#06#, 16#00#,
16#00#, 16#00#, 16#06#, 16#00#, 16#00#, 16#00#, 16#06#, 16#00#, 16#00#,
16#00#, 16#06#, 16#00#, 16#00#, 16#00#, 16#03#, 16#00#, 16#00#, 16#00#,
16#03#, 16#80#, 16#00#, 16#00#, 16#01#, 16#C0#, 16#01#, 16#80#, 16#00#,
16#F0#, 16#1F#, 16#00#, 16#00#, 16#7F#, 16#FC#, 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#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#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#00#, 16#00#, 16#1F#,
16#FE#, 16#00#, 16#00#, 16#78#, 16#00#, 16#00#, 16#00#, 16#E0#, 16#00#,
16#00#, 16#00#, 16#C0#, 16#00#, 16#00#, 16#00#, 16#C0#, 16#00#, 16#00#,
16#01#, 16#80#, 16#00#, 16#00#, 16#01#, 16#80#, 16#00#, 16#00#, 16#3F#,
16#FF#, 16#E0#, 16#00#, 16#7F#, 16#FF#, 16#E0#, 16#00#, 16#03#, 16#00#,
16#00#, 16#00#, 16#03#, 16#00#, 16#00#, 16#00#, 16#03#, 16#00#, 16#00#,
16#00#, 16#03#, 16#00#, 16#00#, 16#00#, 16#03#, 16#00#, 16#00#, 16#00#,
16#06#, 16#00#, 16#00#, 16#00#, 16#06#, 16#00#, 16#00#, 16#00#, 16#06#,
16#00#, 16#00#, 16#00#, 16#06#, 16#00#, 16#00#, 16#00#, 16#06#, 16#00#,
16#00#, 16#00#, 16#0C#, 16#00#, 16#00#, 16#00#, 16#0C#, 16#00#, 16#00#,
16#00#, 16#0C#, 16#00#, 16#00#, 16#00#, 16#0C#, 16#00#, 16#00#, 16#00#,
16#08#, 16#00#, 16#00#, 16#00#, 16#18#, 16#00#, 16#00#, 16#07#, 16#FF#,
16#FE#, 16#00#, 16#07#, 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#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#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#0F#, 16#F8#,
16#7C#, 16#00#, 16#3C#, 16#1C#, 16#7C#, 16#00#, 16#70#, 16#06#, 16#C0#,
16#00#, 16#E0#, 16#03#, 16#C0#, 16#01#, 16#C0#, 16#03#, 16#C0#, 16#01#,
16#80#, 16#01#, 16#C0#, 16#03#, 16#00#, 16#01#, 16#80#, 16#03#, 16#00#,
16#01#, 16#80#, 16#06#, 16#00#, 16#01#, 16#80#, 16#06#, 16#00#, 16#01#,
16#80#, 16#06#, 16#00#, 16#01#, 16#80#, 16#06#, 16#00#, 16#03#, 16#00#,
16#06#, 16#00#, 16#03#, 16#00#, 16#06#, 16#00#, 16#07#, 16#00#, 16#07#,
16#00#, 16#0F#, 16#00#, 16#03#, 16#00#, 16#1B#, 16#00#, 16#03#, 16#80#,
16#36#, 16#00#, 16#01#, 16#E0#, 16#E6#, 16#00#, 16#00#, 16#FF#, 16#C6#,
16#00#, 16#00#, 16#3F#, 16#06#, 16#00#, 16#00#, 16#00#, 16#06#, 16#00#,
16#00#, 16#00#, 16#0C#, 16#00#, 16#00#, 16#00#, 16#0C#, 16#00#, 16#00#,
16#00#, 16#18#, 16#00#, 16#00#, 16#00#, 16#18#, 16#00#, 16#00#, 16#00#,
16#30#, 16#00#, 16#00#, 16#00#, 16#E0#, 16#00#, 16#01#, 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#FC#, 16#00#, 16#00#, 16#00#, 16#F8#, 16#00#, 16#00#, 16#00#,
16#18#, 16#00#, 16#00#, 16#00#, 16#18#, 16#00#, 16#00#, 16#00#, 16#18#,
16#00#, 16#00#, 16#00#, 16#18#, 16#00#, 16#00#, 16#00#, 16#30#, 16#00#,
16#00#, 16#00#, 16#30#, 16#7C#, 16#00#, 16#00#, 16#31#, 16#FF#, 16#00#,
16#00#, 16#37#, 16#07#, 16#80#, 16#00#, 16#3C#, 16#01#, 16#80#, 16#00#,
16#68#, 16#01#, 16#80#, 16#00#, 16#70#, 16#01#, 16#C0#, 16#00#, 16#60#,
16#00#, 16#C0#, 16#00#, 16#60#, 16#01#, 16#80#, 16#00#, 16#40#, 16#01#,
16#80#, 16#00#, 16#C0#, 16#01#, 16#80#, 16#00#, 16#C0#, 16#01#, 16#80#,
16#00#, 16#C0#, 16#01#, 16#80#, 16#00#, 16#C0#, 16#03#, 16#80#, 16#01#,
16#80#, 16#03#, 16#80#, 16#01#, 16#80#, 16#03#, 16#00#, 16#01#, 16#80#,
16#03#, 16#00#, 16#01#, 16#80#, 16#07#, 16#00#, 16#01#, 16#80#, 16#06#,
16#00#, 16#03#, 16#00#, 16#06#, 16#00#, 16#1F#, 16#E0#, 16#3F#, 16#C0#,
16#1F#, 16#E0#, 16#7F#, 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#38#, 16#00#, 16#00#,
16#00#, 16#38#, 16#00#, 16#00#, 16#00#, 16#70#, 16#00#, 16#00#, 16#00#,
16#70#, 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#3F#, 16#E0#, 16#00#, 16#00#,
16#3F#, 16#E0#, 16#00#, 16#00#, 16#00#, 16#60#, 16#00#, 16#00#, 16#00#,
16#40#, 16#00#, 16#00#, 16#00#, 16#C0#, 16#00#, 16#00#, 16#00#, 16#C0#,
16#00#, 16#00#, 16#00#, 16#C0#, 16#00#, 16#00#, 16#00#, 16#C0#, 16#00#,
16#00#, 16#00#, 16#80#, 16#00#, 16#00#, 16#01#, 16#80#, 16#00#, 16#00#,
16#01#, 16#80#, 16#00#, 16#00#, 16#01#, 16#80#, 16#00#, 16#00#, 16#01#,
16#80#, 16#00#, 16#00#, 16#03#, 16#00#, 16#00#, 16#00#, 16#03#, 16#00#,
16#00#, 16#00#, 16#03#, 16#00#, 16#00#, 16#00#, 16#03#, 16#00#, 16#00#,
16#00#, 16#03#, 16#00#, 16#00#, 16#07#, 16#FF#, 16#FF#, 16#00#, 16#07#,
16#FF#, 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#07#, 16#00#, 16#00#, 16#00#,
16#07#, 16#00#, 16#00#, 16#00#, 16#07#, 16#00#, 16#00#, 16#00#, 16#07#,
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#3F#, 16#FF#, 16#00#, 16#00#, 16#3F#,
16#FF#, 16#00#, 16#00#, 16#00#, 16#03#, 16#00#, 16#00#, 16#00#, 16#03#,
16#00#, 16#00#, 16#00#, 16#06#, 16#00#, 16#00#, 16#00#, 16#06#, 16#00#,
16#00#, 16#00#, 16#06#, 16#00#, 16#00#, 16#00#, 16#06#, 16#00#, 16#00#,
16#00#, 16#06#, 16#00#, 16#00#, 16#00#, 16#0C#, 16#00#, 16#00#, 16#00#,
16#0C#, 16#00#, 16#00#, 16#00#, 16#0C#, 16#00#, 16#00#, 16#00#, 16#0C#,
16#00#, 16#00#, 16#00#, 16#08#, 16#00#, 16#00#, 16#00#, 16#18#, 16#00#,
16#00#, 16#00#, 16#18#, 16#00#, 16#00#, 16#00#, 16#18#, 16#00#, 16#00#,
16#00#, 16#18#, 16#00#, 16#00#, 16#00#, 16#30#, 16#00#, 16#00#, 16#00#,
16#30#, 16#00#, 16#00#, 16#00#, 16#30#, 16#00#, 16#00#, 16#00#, 16#30#,
16#00#, 16#00#, 16#00#, 16#30#, 16#00#, 16#00#, 16#00#, 16#60#, 16#00#,
16#00#, 16#00#, 16#E0#, 16#00#, 16#00#, 16#01#, 16#C0#, 16#00#, 16#00#,
16#03#, 16#80#, 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#7E#, 16#00#,
16#00#, 16#00#, 16#7C#, 16#00#, 16#00#, 16#00#, 16#0C#, 16#00#, 16#00#,
16#00#, 16#0C#, 16#00#, 16#00#, 16#00#, 16#0C#, 16#00#, 16#00#, 16#00#,
16#0C#, 16#00#, 16#00#, 16#00#, 16#18#, 16#00#, 16#00#, 16#00#, 16#18#,
16#00#, 16#00#, 16#00#, 16#18#, 16#1F#, 16#E0#, 16#00#, 16#18#, 16#1F#,
16#E0#, 16#00#, 16#18#, 16#0E#, 16#00#, 16#00#, 16#30#, 16#18#, 16#00#,
16#00#, 16#30#, 16#70#, 16#00#, 16#00#, 16#30#, 16#E0#, 16#00#, 16#00#,
16#31#, 16#80#, 16#00#, 16#00#, 16#67#, 16#00#, 16#00#, 16#00#, 16#6E#,
16#00#, 16#00#, 16#00#, 16#7F#, 16#00#, 16#00#, 16#00#, 16#73#, 16#80#,
16#00#, 16#00#, 16#61#, 16#80#, 16#00#, 16#00#, 16#C1#, 16#C0#, 16#00#,
16#00#, 16#C0#, 16#E0#, 16#00#, 16#00#, 16#C0#, 16#70#, 16#00#, 16#00#,
16#C0#, 16#30#, 16#00#, 16#01#, 16#80#, 16#18#, 16#00#, 16#01#, 16#80#,
16#1C#, 16#00#, 16#1F#, 16#80#, 16#7F#, 16#C0#, 16#1F#, 16#80#, 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#0F#, 16#F8#, 16#00#,
16#00#, 16#0F#, 16#F8#, 16#00#, 16#00#, 16#00#, 16#18#, 16#00#, 16#00#,
16#00#, 16#30#, 16#00#, 16#00#, 16#00#, 16#30#, 16#00#, 16#00#, 16#00#,
16#30#, 16#00#, 16#00#, 16#00#, 16#30#, 16#00#, 16#00#, 16#00#, 16#20#,
16#00#, 16#00#, 16#00#, 16#60#, 16#00#, 16#00#, 16#00#, 16#60#, 16#00#,
16#00#, 16#00#, 16#60#, 16#00#, 16#00#, 16#00#, 16#60#, 16#00#, 16#00#,
16#00#, 16#C0#, 16#00#, 16#00#, 16#00#, 16#C0#, 16#00#, 16#00#, 16#00#,
16#C0#, 16#00#, 16#00#, 16#00#, 16#C0#, 16#00#, 16#00#, 16#00#, 16#C0#,
16#00#, 16#00#, 16#01#, 16#80#, 16#00#, 16#00#, 16#01#, 16#80#, 16#00#,
16#00#, 16#01#, 16#80#, 16#00#, 16#00#, 16#01#, 16#80#, 16#00#, 16#00#,
16#03#, 16#00#, 16#00#, 16#00#, 16#03#, 16#00#, 16#00#, 16#00#, 16#03#,
16#00#, 16#00#, 16#00#, 16#03#, 16#00#, 16#00#, 16#00#, 16#03#, 16#00#,
16#00#, 16#07#, 16#FF#, 16#FF#, 16#00#, 16#07#, 16#FF#, 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#07#, 16#03#, 16#C0#,
16#07#, 16#9F#, 16#87#, 16#E0#, 16#07#, 16#B1#, 16#CC#, 16#70#, 16#01#,
16#E0#, 16#D8#, 16#30#, 16#01#, 16#C0#, 16#F0#, 16#30#, 16#01#, 16#80#,
16#E0#, 16#30#, 16#03#, 16#00#, 16#C0#, 16#30#, 16#03#, 16#00#, 16#C0#,
16#30#, 16#03#, 16#00#, 16#C0#, 16#30#, 16#03#, 16#00#, 16#C0#, 16#20#,
16#03#, 16#01#, 16#80#, 16#60#, 16#06#, 16#01#, 16#80#, 16#60#, 16#06#,
16#01#, 16#80#, 16#60#, 16#06#, 16#01#, 16#80#, 16#60#, 16#06#, 16#01#,
16#80#, 16#C0#, 16#04#, 16#03#, 16#00#, 16#C0#, 16#0C#, 16#03#, 16#00#,
16#C0#, 16#0C#, 16#03#, 16#00#, 16#C0#, 16#0C#, 16#03#, 16#00#, 16#C0#,
16#7F#, 16#03#, 16#C1#, 16#F0#, 16#7F#, 16#07#, 16#C1#, 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#7C#, 16#00#, 16#01#,
16#F1#, 16#FF#, 16#00#, 16#01#, 16#F3#, 16#07#, 16#80#, 16#00#, 16#3C#,
16#01#, 16#80#, 16#00#, 16#78#, 16#01#, 16#C0#, 16#00#, 16#70#, 16#00#,
16#C0#, 16#00#, 16#60#, 16#00#, 16#C0#, 16#00#, 16#60#, 16#01#, 16#C0#,
16#00#, 16#60#, 16#01#, 16#80#, 16#00#, 16#C0#, 16#01#, 16#80#, 16#00#,
16#C0#, 16#01#, 16#80#, 16#00#, 16#C0#, 16#01#, 16#80#, 16#00#, 16#C0#,
16#03#, 16#00#, 16#01#, 16#80#, 16#03#, 16#00#, 16#01#, 16#80#, 16#03#,
16#00#, 16#01#, 16#80#, 16#03#, 16#00#, 16#01#, 16#80#, 16#03#, 16#00#,
16#01#, 16#80#, 16#06#, 16#00#, 16#03#, 16#00#, 16#06#, 16#00#, 16#1F#,
16#E0#, 16#3F#, 16#C0#, 16#1F#, 16#E0#, 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#01#, 16#F8#, 16#00#, 16#00#, 16#07#,
16#FF#, 16#00#, 16#00#, 16#1E#, 16#07#, 16#80#, 16#00#, 16#38#, 16#01#,
16#C0#, 16#00#, 16#60#, 16#00#, 16#C0#, 16#00#, 16#C0#, 16#00#, 16#E0#,
16#01#, 16#80#, 16#00#, 16#60#, 16#01#, 16#80#, 16#00#, 16#60#, 16#03#,
16#00#, 16#00#, 16#60#, 16#03#, 16#00#, 16#00#, 16#60#, 16#02#, 16#00#,
16#00#, 16#60#, 16#06#, 16#00#, 16#00#, 16#60#, 16#06#, 16#00#, 16#00#,
16#60#, 16#06#, 16#00#, 16#00#, 16#C0#, 16#06#, 16#00#, 16#00#, 16#C0#,
16#07#, 16#00#, 16#01#, 16#80#, 16#03#, 16#00#, 16#03#, 16#00#, 16#03#,
16#80#, 16#07#, 16#00#, 16#01#, 16#C0#, 16#0E#, 16#00#, 16#00#, 16#E0#,
16#78#, 16#00#, 16#00#, 16#7F#, 16#F0#, 16#00#, 16#00#, 16#1F#, 16#80#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#FE#, 16#00#, 16#07#, 16#E3#, 16#FF#,
16#80#, 16#07#, 16#E7#, 16#03#, 16#C0#, 16#00#, 16#CC#, 16#01#, 16#E0#,
16#00#, 16#D8#, 16#00#, 16#E0#, 16#00#, 16#F0#, 16#00#, 16#60#, 16#00#,
16#E0#, 16#00#, 16#30#, 16#00#, 16#C0#, 16#00#, 16#30#, 16#01#, 16#C0#,
16#00#, 16#30#, 16#01#, 16#80#, 16#00#, 16#30#, 16#01#, 16#80#, 16#00#,
16#30#, 16#01#, 16#80#, 16#00#, 16#20#, 16#01#, 16#80#, 16#00#, 16#60#,
16#03#, 16#80#, 16#00#, 16#60#, 16#03#, 16#80#, 16#00#, 16#C0#, 16#03#,
16#C0#, 16#01#, 16#C0#, 16#03#, 16#C0#, 16#03#, 16#80#, 16#03#, 16#60#,
16#07#, 16#00#, 16#06#, 16#78#, 16#1E#, 16#00#, 16#06#, 16#3F#, 16#F8#,
16#00#, 16#06#, 16#0F#, 16#E0#, 16#00#, 16#06#, 16#00#, 16#00#, 16#00#,
16#06#, 16#00#, 16#00#, 16#00#, 16#0C#, 16#00#, 16#00#, 16#00#, 16#0C#,
16#00#, 16#00#, 16#00#, 16#0C#, 16#00#, 16#00#, 16#00#, 16#0C#, 16#00#,
16#00#, 16#00#, 16#08#, 16#00#, 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#00#, 16#03#, 16#F0#, 16#00#, 16#00#, 16#0F#, 16#FC#, 16#3E#,
16#00#, 16#3C#, 16#0E#, 16#3E#, 16#00#, 16#70#, 16#03#, 16#60#, 16#00#,
16#E0#, 16#01#, 16#E0#, 16#01#, 16#C0#, 16#01#, 16#E0#, 16#01#, 16#80#,
16#00#, 16#E0#, 16#03#, 16#00#, 16#00#, 16#C0#, 16#03#, 16#00#, 16#00#,
16#C0#, 16#06#, 16#00#, 16#00#, 16#C0#, 16#06#, 16#00#, 16#00#, 16#C0#,
16#06#, 16#00#, 16#00#, 16#C0#, 16#06#, 16#00#, 16#01#, 16#80#, 16#06#,
16#00#, 16#01#, 16#80#, 16#06#, 16#00#, 16#03#, 16#80#, 16#07#, 16#00#,
16#07#, 16#80#, 16#03#, 16#00#, 16#0D#, 16#80#, 16#03#, 16#80#, 16#1B#,
16#00#, 16#01#, 16#E0#, 16#73#, 16#00#, 16#00#, 16#FF#, 16#E3#, 16#00#,
16#00#, 16#3F#, 16#83#, 16#00#, 16#00#, 16#00#, 16#03#, 16#00#, 16#00#,
16#00#, 16#06#, 16#00#, 16#00#, 16#00#, 16#06#, 16#00#, 16#00#, 16#00#,
16#06#, 16#00#, 16#00#, 16#00#, 16#06#, 16#00#, 16#00#, 16#00#, 16#04#,
16#00#, 16#00#, 16#00#, 16#0C#, 16#00#, 16#00#, 16#03#, 16#FF#, 16#C0#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#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#03#, 16#E0#, 16#00#,
16#7F#, 16#0F#, 16#F8#, 16#00#, 16#06#, 16#3C#, 16#18#, 16#00#, 16#06#,
16#70#, 16#00#, 16#00#, 16#07#, 16#E0#, 16#00#, 16#00#, 16#07#, 16#80#,
16#00#, 16#00#, 16#07#, 16#00#, 16#00#, 16#00#, 16#0C#, 16#00#, 16#00#,
16#00#, 16#0C#, 16#00#, 16#00#, 16#00#, 16#0C#, 16#00#, 16#00#, 16#00#,
16#0C#, 16#00#, 16#00#, 16#00#, 16#18#, 16#00#, 16#00#, 16#00#, 16#18#,
16#00#, 16#00#, 16#00#, 16#18#, 16#00#, 16#00#, 16#00#, 16#18#, 16#00#,
16#00#, 16#00#, 16#18#, 16#00#, 16#00#, 16#00#, 16#30#, 16#00#, 16#00#,
16#00#, 16#30#, 16#00#, 16#00#, 16#0F#, 16#FF#, 16#FC#, 16#00#, 16#0F#,
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#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#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#F8#, 16#00#, 16#00#, 16#0F#, 16#FE#, 16#40#, 16#00#, 16#1E#,
16#07#, 16#C0#, 16#00#, 16#38#, 16#01#, 16#C0#, 16#00#, 16#70#, 16#00#,
16#C0#, 16#00#, 16#60#, 16#00#, 16#80#, 16#00#, 16#60#, 16#00#, 16#80#,
16#00#, 16#70#, 16#00#, 16#00#, 16#00#, 16#78#, 16#00#, 16#00#, 16#00#,
16#3F#, 16#E0#, 16#00#, 16#00#, 16#07#, 16#FC#, 16#00#, 16#00#, 16#00#,
16#1E#, 16#00#, 16#00#, 16#00#, 16#07#, 16#00#, 16#00#, 16#00#, 16#03#,
16#80#, 16#00#, 16#00#, 16#03#, 16#80#, 16#03#, 16#00#, 16#03#, 16#80#,
16#03#, 16#00#, 16#03#, 16#00#, 16#03#, 16#00#, 16#07#, 16#00#, 16#07#,
16#80#, 16#0E#, 16#00#, 16#07#, 16#E0#, 16#3C#, 16#00#, 16#06#, 16#FF#,
16#F0#, 16#00#, 16#00#, 16#1F#, 16#C0#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#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#0C#, 16#00#, 16#00#, 16#00#, 16#0C#, 16#00#, 16#00#, 16#00#,
16#08#, 16#00#, 16#00#, 16#00#, 16#18#, 16#00#, 16#00#, 16#00#, 16#18#,
16#00#, 16#00#, 16#03#, 16#FF#, 16#FF#, 16#00#, 16#03#, 16#FF#, 16#FF#,
16#00#, 16#00#, 16#30#, 16#00#, 16#00#, 16#00#, 16#30#, 16#00#, 16#00#,
16#00#, 16#30#, 16#00#, 16#00#, 16#00#, 16#30#, 16#00#, 16#00#, 16#00#,
16#30#, 16#00#, 16#00#, 16#00#, 16#60#, 16#00#, 16#00#, 16#00#, 16#60#,
16#00#, 16#00#, 16#00#, 16#60#, 16#00#, 16#00#, 16#00#, 16#60#, 16#00#,
16#00#, 16#00#, 16#60#, 16#00#, 16#00#, 16#00#, 16#C0#, 16#00#, 16#00#,
16#00#, 16#C0#, 16#00#, 16#00#, 16#00#, 16#C0#, 16#00#, 16#00#, 16#00#,
16#C0#, 16#00#, 16#00#, 16#00#, 16#C0#, 16#00#, 16#00#, 16#00#, 16#C0#,
16#03#, 16#00#, 16#00#, 16#E0#, 16#1F#, 16#00#, 16#00#, 16#7F#, 16#FC#,
16#00#, 16#00#, 16#1F#, 16#C0#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#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#0F#, 16#E0#, 16#03#, 16#F0#, 16#0F#, 16#C0#,
16#00#, 16#60#, 16#00#, 16#C0#, 16#00#, 16#60#, 16#00#, 16#C0#, 16#00#,
16#60#, 16#00#, 16#C0#, 16#00#, 16#60#, 16#00#, 16#C0#, 16#00#, 16#60#,
16#01#, 16#80#, 16#00#, 16#C0#, 16#01#, 16#80#, 16#00#, 16#C0#, 16#01#,
16#80#, 16#00#, 16#C0#, 16#01#, 16#80#, 16#00#, 16#C0#, 16#01#, 16#80#,
16#00#, 16#C0#, 16#03#, 16#00#, 16#01#, 16#80#, 16#03#, 16#00#, 16#01#,
16#80#, 16#03#, 16#00#, 16#01#, 16#80#, 16#03#, 16#00#, 16#01#, 16#80#,
16#07#, 16#00#, 16#01#, 16#80#, 16#1E#, 16#00#, 16#01#, 16#80#, 16#3E#,
16#00#, 16#01#, 16#C1#, 16#E7#, 16#C0#, 16#00#, 16#FF#, 16#C7#, 16#C0#,
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#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#03#, 16#FE#, 16#07#, 16#FE#, 16#07#, 16#FE#, 16#07#, 16#FE#, 16#00#,
16#E0#, 16#00#, 16#60#, 16#00#, 16#60#, 16#00#, 16#C0#, 16#00#, 16#60#,
16#00#, 16#C0#, 16#00#, 16#60#, 16#01#, 16#80#, 16#00#, 16#70#, 16#03#,
16#00#, 16#00#, 16#30#, 16#03#, 16#00#, 16#00#, 16#30#, 16#06#, 16#00#,
16#00#, 16#30#, 16#06#, 16#00#, 16#00#, 16#30#, 16#0C#, 16#00#, 16#00#,
16#18#, 16#18#, 16#00#, 16#00#, 16#18#, 16#18#, 16#00#, 16#00#, 16#18#,
16#30#, 16#00#, 16#00#, 16#18#, 16#60#, 16#00#, 16#00#, 16#1C#, 16#60#,
16#00#, 16#00#, 16#0C#, 16#C0#, 16#00#, 16#00#, 16#0D#, 16#80#, 16#00#,
16#00#, 16#0F#, 16#80#, 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#03#,
16#F8#, 16#01#, 16#FE#, 16#07#, 16#F8#, 16#01#, 16#FE#, 16#01#, 16#80#,
16#00#, 16#30#, 16#01#, 16#80#, 16#00#, 16#30#, 16#01#, 16#80#, 16#00#,
16#60#, 16#01#, 16#80#, 16#C0#, 16#60#, 16#01#, 16#81#, 16#E0#, 16#40#,
16#01#, 16#81#, 16#E0#, 16#C0#, 16#01#, 16#83#, 16#60#, 16#C0#, 16#01#,
16#83#, 16#61#, 16#80#, 16#01#, 16#86#, 16#61#, 16#80#, 16#01#, 16#8E#,
16#63#, 16#00#, 16#01#, 16#8C#, 16#63#, 16#00#, 16#01#, 16#9C#, 16#23#,
16#00#, 16#01#, 16#98#, 16#36#, 16#00#, 16#01#, 16#B0#, 16#36#, 16#00#,
16#01#, 16#B0#, 16#3C#, 16#00#, 16#01#, 16#E0#, 16#3C#, 16#00#, 16#00#,
16#E0#, 16#38#, 16#00#, 16#00#, 16#C0#, 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#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#FE#,
16#07#, 16#F8#, 16#01#, 16#FE#, 16#07#, 16#F8#, 16#00#, 16#70#, 16#00#,
16#C0#, 16#00#, 16#38#, 16#03#, 16#80#, 16#00#, 16#1C#, 16#07#, 16#00#,
16#00#, 16#0C#, 16#0E#, 16#00#, 16#00#, 16#06#, 16#18#, 16#00#, 16#00#,
16#07#, 16#70#, 16#00#, 16#00#, 16#03#, 16#E0#, 16#00#, 16#00#, 16#01#,
16#C0#, 16#00#, 16#00#, 16#03#, 16#C0#, 16#00#, 16#00#, 16#0E#, 16#E0#,
16#00#, 16#00#, 16#1C#, 16#70#, 16#00#, 16#00#, 16#38#, 16#38#, 16#00#,
16#00#, 16#70#, 16#1C#, 16#00#, 16#00#, 16#C0#, 16#0C#, 16#00#, 16#03#,
16#80#, 16#06#, 16#00#, 16#07#, 16#00#, 16#07#, 16#00#, 16#1F#, 16#E0#,
16#7F#, 16#C0#, 16#1F#, 16#E0#, 16#7F#, 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#01#, 16#FC#, 16#03#,
16#FC#, 16#03#, 16#FC#, 16#03#, 16#FC#, 16#00#, 16#E0#, 16#00#, 16#60#,
16#00#, 16#60#, 16#00#, 16#60#, 16#00#, 16#60#, 16#00#, 16#C0#, 16#00#,
16#60#, 16#01#, 16#80#, 16#00#, 16#70#, 16#01#, 16#80#, 16#00#, 16#30#,
16#03#, 16#00#, 16#00#, 16#30#, 16#06#, 16#00#, 16#00#, 16#30#, 16#06#,
16#00#, 16#00#, 16#18#, 16#0C#, 16#00#, 16#00#, 16#18#, 16#18#, 16#00#,
16#00#, 16#18#, 16#30#, 16#00#, 16#00#, 16#1C#, 16#30#, 16#00#, 16#00#,
16#0C#, 16#60#, 16#00#, 16#00#, 16#0C#, 16#C0#, 16#00#, 16#00#, 16#0C#,
16#C0#, 16#00#, 16#00#, 16#07#, 16#80#, 16#00#, 16#00#, 16#07#, 16#00#,
16#00#, 16#00#, 16#07#, 16#00#, 16#00#, 16#00#, 16#06#, 16#00#, 16#00#,
16#00#, 16#0C#, 16#00#, 16#00#, 16#00#, 16#0C#, 16#00#, 16#00#, 16#00#,
16#18#, 16#00#, 16#00#, 16#00#, 16#30#, 16#00#, 16#00#, 16#00#, 16#60#,
16#00#, 16#00#, 16#00#, 16#60#, 16#00#, 16#00#, 16#7F#, 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#3F#, 16#FF#, 16#C0#,
16#00#, 16#3F#, 16#FF#, 16#C0#, 16#00#, 16#60#, 16#01#, 16#80#, 16#00#,
16#60#, 16#03#, 16#00#, 16#00#, 16#60#, 16#06#, 16#00#, 16#00#, 16#00#,
16#0C#, 16#00#, 16#00#, 16#00#, 16#38#, 16#00#, 16#00#, 16#00#, 16#70#,
16#00#, 16#00#, 16#00#, 16#E0#, 16#00#, 16#00#, 16#01#, 16#C0#, 16#00#,
16#00#, 16#03#, 16#80#, 16#00#, 16#00#, 16#07#, 16#00#, 16#00#, 16#00#,
16#0C#, 16#00#, 16#00#, 16#00#, 16#18#, 16#00#, 16#00#, 16#00#, 16#30#,
16#00#, 16#00#, 16#00#, 16#60#, 16#03#, 16#00#, 16#00#, 16#C0#, 16#03#,
16#00#, 16#01#, 16#80#, 16#03#, 16#00#, 16#03#, 16#FF#, 16#FE#, 16#00#,
16#03#, 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#03#, 16#80#, 16#00#, 16#00#, 16#0F#, 16#80#, 16#00#, 16#00#,
16#1C#, 16#00#, 16#00#, 16#00#, 16#18#, 16#00#, 16#00#, 16#00#, 16#30#,
16#00#, 16#00#, 16#00#, 16#30#, 16#00#, 16#00#, 16#00#, 16#30#, 16#00#,
16#00#, 16#00#, 16#30#, 16#00#, 16#00#, 16#00#, 16#60#, 16#00#, 16#00#,
16#00#, 16#60#, 16#00#, 16#00#, 16#00#, 16#60#, 16#00#, 16#00#, 16#00#,
16#60#, 16#00#, 16#00#, 16#00#, 16#C0#, 16#00#, 16#00#, 16#00#, 16#C0#,
16#00#, 16#00#, 16#01#, 16#80#, 16#00#, 16#00#, 16#07#, 16#80#, 16#00#,
16#00#, 16#3E#, 16#00#, 16#00#, 16#00#, 16#3E#, 16#00#, 16#00#, 16#00#,
16#07#, 16#00#, 16#00#, 16#00#, 16#03#, 16#00#, 16#00#, 16#00#, 16#01#,
16#80#, 16#00#, 16#00#, 16#01#, 16#80#, 16#00#, 16#00#, 16#03#, 16#00#,
16#00#, 16#00#, 16#03#, 16#00#, 16#00#, 16#00#, 16#03#, 16#00#, 16#00#,
16#00#, 16#03#, 16#00#, 16#00#, 16#00#, 16#03#, 16#00#, 16#00#, 16#00#,
16#06#, 16#00#, 16#00#, 16#00#, 16#06#, 16#00#, 16#00#, 16#00#, 16#06#,
16#00#, 16#00#, 16#00#, 16#06#, 16#00#, 16#00#, 16#00#, 16#07#, 16#00#,
16#00#, 16#00#, 16#07#, 16#C0#, 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#00#, 16#00#, 16#00#, 16#00#,
16#18#, 16#00#, 16#00#, 16#00#, 16#18#, 16#00#, 16#00#, 16#00#, 16#10#,
16#00#, 16#00#, 16#00#, 16#30#, 16#00#, 16#00#, 16#00#, 16#30#, 16#00#,
16#00#, 16#00#, 16#30#, 16#00#, 16#00#, 16#00#, 16#30#, 16#00#, 16#00#,
16#00#, 16#60#, 16#00#, 16#00#, 16#00#, 16#60#, 16#00#, 16#00#, 16#00#,
16#60#, 16#00#, 16#00#, 16#00#, 16#60#, 16#00#, 16#00#, 16#00#, 16#60#,
16#00#, 16#00#, 16#00#, 16#C0#, 16#00#, 16#00#, 16#00#, 16#C0#, 16#00#,
16#00#, 16#00#, 16#C0#, 16#00#, 16#00#, 16#00#, 16#C0#, 16#00#, 16#00#,
16#00#, 16#80#, 16#00#, 16#00#, 16#01#, 16#80#, 16#00#, 16#00#, 16#01#,
16#80#, 16#00#, 16#00#, 16#01#, 16#80#, 16#00#, 16#00#, 16#01#, 16#80#,
16#00#, 16#00#, 16#01#, 16#00#, 16#00#, 16#00#, 16#03#, 16#00#, 16#00#,
16#00#, 16#03#, 16#00#, 16#00#, 16#00#, 16#03#, 16#00#, 16#00#, 16#00#,
16#03#, 16#00#, 16#00#, 16#00#, 16#06#, 16#00#, 16#00#, 16#00#, 16#06#,
16#00#, 16#00#, 16#00#, 16#06#, 16#00#, 16#00#, 16#00#, 16#06#, 16#00#,
16#00#, 16#00#, 16#04#, 16#00#, 16#00#, 16#00#, 16#0C#, 16#00#, 16#00#,
16#00#, 16#0C#, 16#00#, 16#00#, 16#00#, 16#0C#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#,
16#00#, 16#00#, 16#00#, 16#00#, 16#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#C0#,
16#00#, 16#00#, 16#01#, 16#E0#, 16#00#, 16#00#, 16#00#, 16#70#, 16#00#,
16#00#, 16#00#, 16#30#, 16#00#, 16#00#, 16#00#, 16#30#, 16#00#, 16#00#,
16#00#, 16#30#, 16#00#, 16#00#, 16#00#, 16#30#, 16#00#, 16#00#, 16#00#,
16#60#, 16#00#, 16#00#, 16#00#, 16#60#, 16#00#, 16#00#, 16#00#, 16#60#,
16#00#, 16#00#, 16#00#, 16#60#, 16#00#, 16#00#, 16#00#, 16#60#, 16#00#,
16#00#, 16#00#, 16#C0#, 16#00#, 16#00#, 16#00#, 16#C0#, 16#00#, 16#00#,
16#00#, 16#60#, 16#00#, 16#00#, 16#00#, 16#70#, 16#00#, 16#00#, 16#00#,
16#3E#, 16#00#, 16#00#, 16#00#, 16#3E#, 16#00#, 16#00#, 16#00#, 16#F0#,
16#00#, 16#00#, 16#01#, 16#C0#, 16#00#, 16#00#, 16#01#, 16#80#, 16#00#,
16#00#, 16#03#, 16#00#, 16#00#, 16#00#, 16#03#, 16#00#, 16#00#, 16#00#,
16#03#, 16#00#, 16#00#, 16#00#, 16#03#, 16#00#, 16#00#, 16#00#, 16#03#,
16#00#, 16#00#, 16#00#, 16#06#, 16#00#, 16#00#, 16#00#, 16#06#, 16#00#,
16#00#, 16#00#, 16#06#, 16#00#, 16#00#, 16#00#, 16#06#, 16#00#, 16#00#,
16#00#, 16#0C#, 16#00#, 16#00#, 16#00#, 16#1C#, 16#00#, 16#00#, 16#00#,
16#F8#, 16#00#, 16#00#, 16#00#, 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#1E#, 16#00#, 16#00#, 16#00#, 16#3F#, 16#80#, 16#60#, 16#00#, 16#E1#,
16#C0#, 16#E0#, 16#01#, 16#C0#, 16#E3#, 16#C0#, 16#01#, 16#80#, 16#7F#,
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#);
Font_D : aliased constant Bitmap_Font :=
(
Bytes_Per_Glyph => 188,
Glyph_Width => 32,
Glyph_Height => 47,
Data => FreeMonoOblique24pt7bBitmaps'Access);
Font : constant Bitmap_Font_Ref := Font_D'Access;
end GESTE_Fonts.FreeMonoOblique24pt7b;
|
silky/synth | Ada | 33,352 | adb | -- This file is covered by the Internet Software Consortium (ISC) License
-- Reference: ../License.txt
with Ada.Directories;
with Ada.Text_IO;
with Ada.Characters.Latin_1;
with GNAT.OS_Lib;
with Unix;
package body Parameters is
package AD renames Ada.Directories;
package TIO renames Ada.Text_IO;
package LAT renames Ada.Characters.Latin_1;
package OSL renames GNAT.OS_Lib;
--------------------------
-- load_configuration --
--------------------------
function load_configuration (num_cores : cpu_range) return Boolean
is
fields_present : Boolean;
global_present : Boolean;
sel_profile : JT.Text;
begin
if not AD.Exists (conf_location) then
declare
test : String := determine_portsdirs;
begin
if test = "" then
return False;
end if;
end;
declare
File_Handle : TIO.File_Type;
begin
mkdirp_from_file (conf_location);
TIO.Create (File => File_Handle,
Mode => TIO.Out_File,
Name => conf_location);
TIO.Put_Line (File_Handle, "; This Synth configuration file is " &
"automatically generated");
TIO.Put_Line (File_Handle, "; Take care when hand editing!");
TIO.Close (File => File_Handle);
exception
when Error : others =>
TIO.Put_Line ("Failed to create " & conf_location);
return False;
end;
end if;
internal_config.Init (File_Name => conf_location,
On_Type_Mismatch => Config.Be_Quiet);
if section_exists (master_section, global_01) then
global_present := all_global_present;
else
write_blank_section (master_section);
global_present := False;
end if;
declare
envprofile : String := OSL.Getenv ("SYNTHPROFILE").all;
begin
sel_profile := extract_string (master_section, global_01, live_system);
if envprofile /= "" then
if section_exists (envprofile, Field_01) then
sel_profile := JT.SUS (envprofile);
end if;
end if;
end;
declare
profile : constant String := JT.USS (sel_profile);
begin
if section_exists (profile, Field_01) then
fields_present := all_params_present (profile);
else
write_blank_section (section => profile);
fields_present := False;
end if;
configuration := load_specific_profile (profile, num_cores);
end;
if not fields_present then
write_configuration (JT.USS (configuration.profile));
end if;
if not global_present then
write_master_section;
end if;
return True;
exception
when mishap : others => return False;
end load_configuration;
---------------------------
-- determine_portsdirs --
---------------------------
function determine_portsdirs return String
is
function get_varname return String;
function get_mkconf return String;
function get_varname return String is
begin
case software_framework is
when pkgsrc => return "PKGSRCDIR";
when ports_collection => return "PORTSDIR";
end case;
end get_varname;
function get_mkconf return String is
begin
case software_framework is
when pkgsrc => return "mk.conf";
when ports_collection => return "/etc/make.conf";
end case;
end get_mkconf;
varname : constant String := get_varname;
mkconf : constant String := get_mkconf;
begin
-- PORTSDIR in environment takes precedence
declare
portsdir : String := OSL.Getenv (varname).all;
begin
if portsdir /= "" then
if AD.Exists (portsdir) then
return portsdir;
end if;
end if;
end;
case software_framework is
when pkgsrc =>
if AD.Exists (std_pkgsrc_loc & "/mk/pkgformat/pkgng") then
return std_pkgsrc_loc;
end if;
when ports_collection =>
declare
portsdir : String := query_portsdir;
begin
if portsdir = "" then
TIO.Put_Line ("It seems that a blank " & varname &
" is defined in " & mkconf);
return "";
end if;
if AD.Exists (portsdir) then
return portsdir;
end if;
end;
if AD.Exists (std_dports_loc) then
return std_dports_loc;
elsif AD.Exists (std_ports_loc) then
return std_ports_loc;
end if;
end case;
TIO.Put_Line (varname & " cannot be determined.");
TIO.Put_Line ("Please set " & varname & " to a valid path in the environment or " &
mkconf);
return "";
end determine_portsdirs;
-----------------------------
-- load_specific_profile --
-----------------------------
function load_specific_profile (profile : String; num_cores : cpu_range)
return configuration_record
is
function opsys_ok return Boolean;
def_builders : Integer;
def_jlimit : Integer;
res : configuration_record;
function opsys_ok return Boolean is
begin
case software_framework is
when ports_collection =>
return (JT.equivalent (res.operating_sys, "FreeBSD") or else
JT.equivalent (res.operating_sys, "DragonFly"));
when pkgsrc =>
-- OpenBSD and derivatives are not supported because they lack mount_null (!)
return (JT.equivalent (res.operating_sys, "FreeBSD") or else
JT.equivalent (res.operating_sys, "DragonFly") or else
JT.equivalent (res.operating_sys, "NetBSD") or else
JT.equivalent (res.operating_sys, "Linux") or else
JT.equivalent (res.operating_sys, "SunOS")
);
end case;
end opsys_ok;
begin
-- The profile *must* exist before this procedure is called!
default_parallelism (num_cores => num_cores,
num_builders => def_builders,
jobs_per_builder => def_jlimit);
res.dir_packages := extract_string (profile, Field_01, LS_Packages);
if param_set (profile, Field_03) then
-- We can only check determine_portsdirs when no synth.ini file
-- exists. It's possible that it was configured with PORTSDIR
-- set which can be removed later. Use the dummy std_ports_loc
-- when we are sure the parameter is set (so dummy will NOT be used)
res.dir_portsdir := extract_string (profile, Field_03,
std_ports_loc);
else
res.dir_portsdir := extract_string (profile, Field_03,
determine_portsdirs);
end if;
res.dir_repository := res.dir_packages;
JT.SU.Append (res.dir_repository, "/All");
if param_set (profile, Field_04) then
res.dir_distfiles := extract_string (profile, Field_04, std_distfiles);
else
res.dir_distfiles := extract_string
(profile, Field_04, query_distfiles (JT.USS (res.dir_portsdir)));
end if;
res.dir_buildbase := extract_string (profile, Field_05, LS_Buildbase);
res.dir_logs := extract_string (profile, Field_06, LS_Logs);
res.dir_ccache := extract_string (profile, Field_07, no_ccache);
res.num_builders := builders
(extract_integer (profile, Field_08, def_builders));
res.jobs_limit := builders
(extract_integer (profile, Field_09, def_jlimit));
if param_set (profile, Field_12) then
res.operating_sys := extract_string (profile, Field_12, std_opsys);
else
res.operating_sys := extract_string
(profile, Field_12, query_opsys (JT.USS (res.dir_portsdir)));
end if;
if not opsys_ok then
TIO.Put_Line ("Unknown operating system: " & JT.USS (res.operating_sys));
case software_framework is
when ports_collection =>
TIO.Put_Line ("This configuration entry must be either 'FreeBSD' or 'DragonFly'");
when pkgsrc =>
TIO.Put_Line ("This configuration entry must be one of: FreeBSD,DragonFly," &
"NetBSD,Linux,SunOS");
end case;
TIO.Put_Line ("Manually edit " & Definitions.host_localbase &
"/etc/synth/synth.ini file to remove the line of the");
TIO.Put_Line (profile & " profile starting with 'Operating_system='");
TIO.Put_Line ("The synth.ini file should regenerate properly on the next Synth command.");
TIO.Put_Line ("");
raise bad_opsys;
end if;
if param_set (profile, Field_10) then
res.tmpfs_workdir := extract_boolean (profile, Field_10, False);
else
res.tmpfs_workdir := extract_boolean
(profile, Field_10, enough_memory (res.num_builders, res.operating_sys));
end if;
if param_set (profile, Field_11) then
res.tmpfs_localbase := extract_boolean (profile, Field_11, False);
else
res.tmpfs_localbase := extract_boolean
(profile, Field_11, enough_memory (res.num_builders, res.operating_sys));
end if;
res.dir_options := extract_string (profile, Field_13, std_options);
res.dir_system := extract_string (profile, Field_14, std_sysbase);
res.avec_ncurses := extract_boolean (profile, Field_15, True);
res.defer_prebuilt := extract_boolean (profile, Field_16, False);
res.profile := JT.SUS (profile);
return res;
end load_specific_profile;
---------------------------
-- write_configuration --
---------------------------
procedure write_configuration (profile : String := live_system)
is
contents : String := generated_section;
begin
internal_config.Replace_Section (profile, contents);
exception
when Error : others =>
raise update_config
with "Failed to update [" & profile & "] at " & conf_location;
end write_configuration;
---------------------------
-- write_blank_section --
---------------------------
procedure write_blank_section (section : String)
is
File_Handle : TIO.File_Type;
begin
TIO.Open (File => File_Handle,
Mode => TIO.Append_File,
Name => conf_location);
TIO.Put_Line (File_Handle, "");
TIO.Put_Line (File_Handle, "[" & section & "]");
TIO.Close (File_Handle);
exception
when Error : others =>
raise update_config
with "Failed to append [" & section & "] at " & conf_location;
end write_blank_section;
---------------------------
-- default_parallelism --
---------------------------
procedure default_parallelism (num_cores : cpu_range;
num_builders : out Integer;
jobs_per_builder : out Integer)
is
begin
case num_cores is
when 1 =>
num_builders := 1;
jobs_per_builder := 1;
when 2 | 3 =>
num_builders := 2;
jobs_per_builder := 2;
when 4 | 5 =>
num_builders := 3;
jobs_per_builder := 3;
when 6 | 7 =>
num_builders := 4;
jobs_per_builder := 3;
when 8 | 9 =>
num_builders := 6;
jobs_per_builder := 4;
when 10 | 11 =>
num_builders := 8;
jobs_per_builder := 4;
when others =>
num_builders := (Integer (num_cores) * 3) / 4;
jobs_per_builder := 5;
end case;
end default_parallelism;
----------------------
-- extract_string --
----------------------
function extract_string (profile, mark, default : String) return JT.Text
is
begin
return JT.SUS (internal_config.Value_Of (profile, mark, default));
end extract_string;
-----------------------
-- extract_boolean --
-----------------------
function extract_boolean (profile, mark : String; default : Boolean)
return Boolean
is
begin
return internal_config.Value_Of (profile, mark, default);
end extract_boolean;
-----------------------
-- extract_integer --
-----------------------
function extract_integer (profile, mark : String; default : Integer)
return Integer is
begin
return internal_config.Value_Of (profile, mark, default);
end extract_integer;
-----------------
-- param_set --
-----------------
function param_set (profile, field : String) return Boolean
is
garbage : constant String := "this-is-garbage";
begin
return internal_config.Value_Of (profile, field, garbage) /= garbage;
end param_set;
----------------------
-- section_exists --
----------------------
function section_exists (profile, mark : String) return Boolean is
begin
return param_set (profile, mark);
end section_exists;
--------------------------
-- all_params_present --
--------------------------
function all_params_present (profile : String) return Boolean is
begin
return
param_set (profile, Field_01) and then
param_set (profile, Field_02) and then
param_set (profile, Field_03) and then
param_set (profile, Field_04) and then
param_set (profile, Field_05) and then
param_set (profile, Field_06) and then
param_set (profile, Field_07) and then
param_set (profile, Field_08) and then
param_set (profile, Field_09) and then
param_set (profile, Field_10) and then
param_set (profile, Field_11) and then
param_set (profile, Field_12) and then
param_set (profile, Field_13) and then
param_set (profile, Field_14) and then
param_set (profile, Field_15) and then
param_set (profile, Field_16);
end all_params_present;
--------------------------
-- all_global_present --
--------------------------
function all_global_present return Boolean is
begin
return
param_set (master_section, global_01);
end all_global_present;
-------------------------
-- generated_section --
-------------------------
function generated_section return String
is
function USS (US : JT.Text) return String;
function BDS (BD : builders) return String;
function TFS (TF : Boolean) return String;
function USS (US : JT.Text) return String is
begin
return "= " & JT.USS (US) & LAT.LF;
end USS;
function BDS (BD : builders) return String
is
BDI : constant String := Integer'Image (Integer (BD));
begin
return LAT.Equals_Sign & BDI & LAT.LF;
end BDS;
function TFS (TF : Boolean) return String is
begin
if TF then
return LAT.Equals_Sign & " true" & LAT.LF;
else
return LAT.Equals_Sign & " false" & LAT.LF;
end if;
end TFS;
begin
return
Field_12 & USS (configuration.operating_sys) &
Field_01 & USS (configuration.dir_packages) &
Field_02 & USS (configuration.dir_repository) &
Field_03 & USS (configuration.dir_portsdir) &
Field_13 & USS (configuration.dir_options) &
Field_04 & USS (configuration.dir_distfiles) &
Field_05 & USS (configuration.dir_buildbase) &
Field_06 & USS (configuration.dir_logs) &
Field_07 & USS (configuration.dir_ccache) &
Field_14 & USS (configuration.dir_system) &
Field_08 & BDS (configuration.num_builders) &
Field_09 & BDS (configuration.jobs_limit) &
Field_10 & TFS (configuration.tmpfs_workdir) &
Field_11 & TFS (configuration.tmpfs_localbase) &
Field_15 & TFS (configuration.avec_ncurses) &
Field_16 & TFS (configuration.defer_prebuilt);
end generated_section;
-----------------------
-- query_distfiles --
-----------------------
function query_distfiles (portsdir : String) return String
is
-- DISTDIR is used by both pkgsrc and ports collection
begin
return query_generic (portsdir, "DISTDIR");
end query_distfiles;
------------------
-- query_opsys --
-------------------
function query_opsys (portsdir : String) return String
is
-- OPSYS is used by both pkgsrc and ports collection
begin
return query_generic (portsdir, "OPSYS");
end query_opsys;
---------------------
-- query_generic --
---------------------
function query_generic (portsdir, value : String) return String
is
-- devel/gmake exists on both pkgsrc and the ports collection
-- The actual port is not significant
command : constant String := host_make_program & " -C " & portsdir &
"/devel/gmake .MAKE.EXPAND_VARIABLES=yes -V " & value;
begin
return query_generic_core (command);
end query_generic;
--------------------------
-- query_generic_core --
--------------------------
function query_generic_core (command : String) return String
is
content : JT.Text;
status : Integer;
CR_loc : Integer;
CR : constant String (1 .. 1) := (1 => Character'Val (10));
begin
content := Unix.piped_command (command, status);
if status /= 0 then
raise make_query with command;
end if;
CR_loc := JT.SU.Index (Source => content, Pattern => CR);
return JT.SU.Slice (Source => content, Low => 1, High => CR_loc - 1);
end query_generic_core;
----------------------
-- query_portsdir --
----------------------
function query_portsdir return String
is
-- This is specific to the ports collection (invalid for pkgsrc)
command : constant String := host_make_program &
" -f /usr/share/mk/bsd.port.mk -V PORTSDIR";
begin
return query_generic_core (command);
exception
when others => return "";
end query_portsdir;
-----------------------------
-- query_physical_memory --
-----------------------------
procedure query_physical_memory is
-- Works for *BSD, DragonFly, Bitrig
-- DF/Free "hw.physmem: 8525971456" (8G)
-- NetBSD "hw.physmem = 1073278976" (1G)
command : constant String := "/sbin/sysctl hw.physmem";
content : JT.Text;
status : Integer;
begin
memory_megs := 1024;
content := Unix.piped_command (command, status);
if status /= 0 then
TIO.Put_Line ("command failed: " & command);
return;
end if;
declare
type styles is (unknown, dragonfly, netbsd);
function get_number_string return String;
style : styles := unknown;
response : constant String :=
JT.USS (content) (1 .. JT.SU.Length (content) - 1);
SP1 : constant String (1 .. 2) := (1 => LAT.Colon,
2 => LAT.Space);
SP2 : constant String (1 .. 2) := (1 => LAT.Equals_Sign,
2 => LAT.Space);
function get_number_string return String is
begin
case style is
when dragonfly => return JT.part_2 (response, SP1);
when netbsd => return JT.part_2 (response, SP2);
when unknown => return "1073741824";
end case;
end get_number_string;
begin
if JT.contains (response, SP1) then
style := dragonfly;
elsif JT.contains (response, SP2) then
style := netbsd;
else
TIO.Put_Line ("Anomaly, unable to detect physical memory");
TIO.Put_Line (response);
return;
end if;
declare
type memtype is mod 2**64;
numbers : String := get_number_string;
bytes : constant memtype := memtype'Value (numbers);
megs : constant memtype := bytes / 1024 / 1024;
begin
memory_megs := Natural (megs);
end;
end;
end query_physical_memory;
-----------------------------------
-- query_physical_memory_linux --
-----------------------------------
procedure query_physical_memory_linux
is
-- On linux, MemTotal should be on first line and that's what we're looking for
command : constant String := "/usr/bin/head /proc/meminfo";
found : Boolean := False;
status : Integer;
comres : JT.Text;
topline : JT.Text;
crlen1 : Natural;
crlen2 : Natural;
begin
comres := Unix.piped_command (command, status);
if status /= 0 then
raise make_query with command;
end if;
crlen1 := JT.SU.Length (comres);
loop
exit when found;
JT.nextline (lineblock => comres, firstline => topline);
crlen2 := JT.SU.Length (comres);
exit when crlen1 = crlen2;
crlen1 := crlen2;
if JT.SU.Length (topline) > 12 then
declare
line : String := JT.USS (topline);
begin
if line (line'First .. line'First + 8) = "MemTotal:" then
declare
type memtype is mod 2**64;
numbers : String :=
JT.part_1 (S => JT.trim (line (line'First + 9 .. line'Last)),
separator => " ");
kilobytes : constant memtype := memtype'Value (numbers);
megs : constant memtype := kilobytes / 1024;
begin
memory_megs := Natural (megs);
end;
found := True;
end if;
end;
end if;
end loop;
end query_physical_memory_linux;
-----------------------------------
-- query_physical_memory_sunos --
-----------------------------------
procedure query_physical_memory_sunos
is
-- On Solaris, we're looking for "Memory size" which should be on second line
command : constant String := "/usr/sbin/prtconf";
found : Boolean := False;
status : Integer;
comres : JT.Text;
topline : JT.Text;
crlen1 : Natural;
crlen2 : Natural;
begin
comres := Unix.piped_command (command, status);
if status /= 0 then
raise make_query with command;
end if;
crlen1 := JT.SU.Length (comres);
loop
exit when found;
JT.nextline (lineblock => comres, firstline => topline);
crlen2 := JT.SU.Length (comres);
exit when crlen1 = crlen2;
crlen1 := crlen2;
if JT.SU.Length (topline) > 12 then
declare
line : String := JT.USS (topline);
begin
if line (line'First .. line'First + 11) = "Memory size:" then
declare
type memtype is mod 2**64;
numbers : String :=
JT.part_1 (line (line'First + 13 .. line'Last), " ");
megabytes : constant memtype := memtype'Value (numbers);
begin
memory_megs := Natural (megabytes);
end;
found := True;
end if;
end;
end if;
end loop;
end query_physical_memory_sunos;
---------------------
-- enough_memory --
---------------------
function enough_memory (num_builders : builders; opsys : JT.Text) return Boolean is
megs_per_slave : Natural;
begin
if memory_megs = 0 then
if JT.equivalent (opsys, "Linux") then
query_physical_memory_linux;
elsif JT.equivalent (opsys, "SunOS") then
query_physical_memory_sunos;
else
query_physical_memory;
end if;
end if;
megs_per_slave := memory_megs / Positive (num_builders);
return megs_per_slave >= 1280;
end enough_memory;
----------------------------
-- write_master_section --
----------------------------
procedure write_master_section
is
function USS (US : JT.Text) return String;
function USS (US : JT.Text) return String is
begin
return "= " & JT.USS (US) & LAT.LF;
end USS;
contents : String :=
global_01 & USS (configuration.profile);
begin
internal_config.Replace_Section (master_section, contents);
exception
when Error : others =>
raise update_config
with "Failed to update [" & master_section & "] at " & conf_location;
end write_master_section;
---------------------
-- sections_list --
---------------------
function sections_list return JT.Text
is
handle : TIO.File_Type;
result : JT.Text;
begin
TIO.Open (File => handle, Mode => TIO.In_File, Name => conf_location);
while not TIO.End_Of_File (handle) loop
declare
Line : String := TIO.Get_Line (handle);
begin
if Line'Length > 0 and then
Line (1) = '[' and then
Line /= "[" & master_section & "]"
then
JT.SU.Append (result, Line (2 .. Line'Last - 1) & LAT.LF);
end if;
end;
end loop;
TIO.Close (handle);
return result;
end sections_list;
-----------------------
-- default_profile --
-----------------------
function default_profile (new_profile : String;
num_cores : cpu_range) return configuration_record
is
result : configuration_record;
def_builders : Integer;
def_jlimit : Integer;
begin
default_parallelism (num_cores => num_cores,
num_builders => def_builders,
jobs_per_builder => def_jlimit);
result.dir_portsdir := JT.SUS (std_ports_loc);
result.operating_sys := JT.SUS (query_opsys (std_ports_loc));
result.profile := JT.SUS (new_profile);
result.dir_system := JT.SUS (std_sysbase);
result.dir_repository := JT.SUS (LS_Packages & "/All");
result.dir_packages := JT.SUS (LS_Packages);
result.dir_distfiles := JT.SUS (std_distfiles);
result.dir_buildbase := JT.SUS (LS_Buildbase);
result.dir_logs := JT.SUS (LS_Logs);
result.dir_ccache := JT.SUS (no_ccache);
result.dir_options := JT.SUS (std_options);
result.num_builders := builders (def_builders);
result.jobs_limit := builders (def_jlimit);
result.tmpfs_workdir := enough_memory (result.num_builders, result.operating_sys);
result.tmpfs_localbase := enough_memory (result.num_builders, result.operating_sys);
result.avec_ncurses := True;
result.defer_prebuilt := False;
write_blank_section (section => new_profile);
return result;
end default_profile;
------------------------
-- mkdirp_from_file --
------------------------
procedure mkdirp_from_file (filename : String)
is
condir : String := AD.Containing_Directory (Name => filename);
begin
AD.Create_Path (New_Directory => condir);
exception
when others =>
raise update_config;
end mkdirp_from_file;
-----------------------
-- all_paths_valid --
-----------------------
function all_paths_valid return Boolean
is
use type AD.File_Kind;
function invalid_directory (folder : JT.Text; desc : String)
return Boolean;
function invalid_directory (folder : JT.Text; desc : String)
return Boolean
is
dossier : constant String := JT.USS (folder);
errmsg : constant String := "Configuration invalid: ";
begin
if AD.Exists (dossier) and then AD.Kind (dossier) = AD.Directory then
return False;
else
TIO.Put_Line (errmsg & desc & " directory: " & dossier);
return True;
end if;
end invalid_directory;
begin
if invalid_directory (configuration.dir_system, "[G] System root") then
return False;
elsif invalid_directory (configuration.dir_packages, "[B] Packages") then
return False;
elsif invalid_directory (configuration.dir_portsdir, "[A] Ports") then
return False;
elsif invalid_directory (configuration.dir_distfiles, "[C] Distfiles")
then
if JT.equivalent (configuration.dir_distfiles, "/usr/ports/distfiles")
then
TIO.Put_Line
("Rather than manually creating a directory at this location, " &
"consider" & LAT.LF &
"using a location outside of the ports tree. Don't forget " &
"to set" & LAT.LF &
"'DISTDIR' to this new location in /etc/make.conf though.");
end if;
return False;
elsif invalid_directory (configuration.dir_logs, "[E] Build logs") then
return False;
elsif invalid_directory (configuration.dir_options, "[D] Port options")
then
return False;
end if;
if JT.USS (configuration.dir_ccache) = no_ccache then
return True;
end if;
return not invalid_directory (configuration.dir_ccache,
"[H] Compiler cache");
end all_paths_valid;
----------------------
-- delete_profile --
----------------------
procedure delete_profile (profile : String)
is
old_file : TIO.File_Type;
new_file : TIO.File_Type;
nextgen : constant String := synth_confdir & "/synth.ini.next";
pattern : constant String := "[" & profile & "]";
blocking : Boolean := False;
begin
if not AD.Exists (conf_location) then
raise update_config
with "The " & conf_location & " configuration file does not exist.";
end if;
if AD.Exists (nextgen) then
AD.Delete_File (nextgen);
end if;
TIO.Create (File => new_file, Mode => TIO.Out_File, Name => nextgen);
TIO.Open (File => old_file, Mode => TIO.In_File, Name => conf_location);
while not TIO.End_Of_File (old_file) loop
declare
Line : constant String := TIO.Get_Line (old_file);
bracket : Boolean := False;
begin
if not JT.IsBlank (Line) then
bracket := Line (1) = '[';
end if;
if bracket and then blocking then
blocking := False;
end if;
if not blocking and then Line = pattern then
blocking := True;
end if;
if not blocking then
TIO.Put_Line (new_file, Line);
end if;
end;
end loop;
TIO.Close (old_file);
TIO.Close (new_file);
AD.Delete_File (conf_location);
AD.Rename (Old_Name => nextgen, New_Name => conf_location);
exception
when others =>
if TIO.Is_Open (new_file) then
TIO.Close (new_file);
end if;
if AD.Exists (nextgen) then
AD.Delete_File (nextgen);
end if;
if TIO.Is_Open (old_file) then
TIO.Close (old_file);
end if;
raise update_config
with "Failed to remove " & profile & " profile";
end delete_profile;
----------------------------------
-- alternative_profiles_exist --
----------------------------------
function alternative_profiles_exist return Boolean
is
counter : Natural := 0;
conf_file : TIO.File_Type;
begin
if not AD.Exists (conf_location) then
return False;
end if;
TIO.Open (File => conf_file, Mode => TIO.In_File, Name => conf_location);
while not TIO.End_Of_File (conf_file) loop
declare
Line : constant String := TIO.Get_Line (conf_file);
bracket : Boolean := False;
begin
if not JT.IsBlank (Line) then
bracket := Line (1) = '[';
end if;
if bracket and then Line /= "[" & master_section & "]"
then
counter := counter + 1;
end if;
end;
end loop;
TIO.Close (conf_file);
return counter > 1;
exception
when others =>
if TIO.Is_Open (conf_file) then
TIO.Close (conf_file);
end if;
return False;
end alternative_profiles_exist;
end Parameters;
|
zhmu/ananas | Ada | 146 | ads | with System.Storage_Elements; use System.Storage_Elements;
package Controlled7 is
procedure Proc (Offset : Storage_Offset);
end Controlled7;
|
jhumphry/auto_counters | Ada | 2,130 | ads | -- flyweights-refcounted_lists.ads
-- A package of singly-linked reference-counting lists for the Flyweights
-- packages
-- Copyright (c) 2016, James Humphry
--
-- Permission to use, copy, modify, and/or distribute this software for any
-- purpose with or without fee is hereby granted, provided that the above
-- copyright notice and this permission notice appear in all copies.
--
-- THE SOFTWARE IS PROVIDED "AS IS" AND THE AUTHOR DISCLAIMS ALL WARRANTIES WITH
-- REGARD TO THIS SOFTWARE INCLUDING ALL IMPLIED WARRANTIES OF MERCHANTABILITY
-- AND FITNESS. IN NO EVENT SHALL THE AUTHOR BE LIABLE FOR ANY SPECIAL, DIRECT,
-- INDIRECT, OR CONSEQUENTIAL DAMAGES OR ANY DAMAGES WHATSOEVER RESULTING FROM
-- LOSS OF USE, DATA OR PROFITS, WHETHER IN AN ACTION OF CONTRACT, NEGLIGENCE
-- OR OTHER TORTIOUS ACTION, ARISING OUT OF OR IN CONNECTION WITH THE USE OR
-- PERFORMANCE OF THIS SOFTWARE.
pragma Profile (No_Implementation_Extensions);
with Flyweights_Lists_Spec;
generic
type Element(<>) is limited private;
type Element_Access is access Element;
with function "=" (Left, Right : in Element) return Boolean is <>;
package Flyweights.Refcounted_Lists is
type Node is private;
type List is access Node;
Empty_List : constant List := null;
procedure Insert (L : in out List;
E : in out Element_Access);
procedure Increment (L : in out List;
E : in Element_Access);
procedure Remove (L : in out List;
Data_Ptr : in Element_Access);
package Lists_Spec is
new Flyweights_Lists_Spec(Element_Access => Element_Access,
List => List,
Empty_List => Empty_List,
Insert => Insert,
Increment => Increment,
Remove => Remove);
private
subtype Node_Access is List;
type Node is
record
Next : Node_Access;
Data : Element_Access;
Use_Count : Natural;
end record;
end Flyweights.Refcounted_Lists;
|
AdaCore/gpr | Ada | 7,127 | adb | --
-- Copyright (C) 2020-2022, AdaCore
-- SPDX-License-Identifier: Apache-2.0
--
with Gpr_Parser_Support.Images; use Gpr_Parser_Support.Images;
package body Gpr_Parser_Support.Diagnostics.Output is
Term_Info : Terminal_Info;
Colors_Init : Boolean := False;
procedure Print_Source_Listing
(Sloc_Range : Source_Location_Range;
Buffer : Text_Buffer_Ifc'Class;
Output_File : File_Type := Standard_Output;
Caretting_Color : ANSI_Color);
-- Print a source listing.
--
-- ``Sloc_Range`` determines range of source code to print.
--
-- ``Buffer`` is used to get access to the source code.
--
-- The source listing is written to ``Output_File``.
--
-- ``Caretting_Color`` is the style used to display the carets to highlight
-- the slice of source code designated by ``Sloc_Range``.
procedure Reset_Colors;
-- Reset the state of colors for ``Term_Info``
------------------
-- Reset_Colors --
------------------
procedure Reset_Colors is
begin
Set_Color (Term_Info, Foreground => Reset);
Set_Style (Term_Info, Reset_All);
end Reset_Colors;
--------------------------
-- Print_Source_Listing --
--------------------------
procedure Print_Source_Listing
(Sloc_Range : Source_Location_Range;
Buffer : Text_Buffer_Ifc'Class;
Output_File : File_Type := Standard_Output;
Caretting_Color : ANSI_Color)
is
procedure Line_Starting (Line_Nb : Natural);
-- Print the "NN |" source listing prefix. ``Line_Nb`` is the line
-- number in a natural integer. If ``Line_Nb`` is 0 then the line
-- number "NN" is blank.
Start_Line : constant Natural := Natural (Sloc_Range.Start_Line);
Start_Col : constant Natural := Natural (Sloc_Range.Start_Column);
End_Line : constant Natural := Natural (Sloc_Range.End_Line);
End_Col : constant Natural := Natural (Sloc_Range.End_Column);
Line_Nb : constant Natural := End_Line - Start_Line + 1;
Col_Size : constant Natural :=
To_Text (Stripped_Image (End_Line))'Length;
----------------
-- Start_Line --
----------------
procedure Line_Starting (Line_Nb : Natural) is
Num_Col : String (1 .. Col_Size) := (others => ' ');
begin
Set_Color (Term_Info, Foreground => Blue);
if Line_Nb >= 1 then
declare
Line_Nb_Img : constant String := Stripped_Image (Line_Nb);
begin
Num_Col (1 .. Line_Nb_Img'Length) := Line_Nb_Img;
end;
end if;
Put (Output_File, Num_Col);
Put (Output_File, " |");
Reset_Colors;
end Line_Starting;
begin
Set_Style (Term_Info, Bright);
-- If the number of line to display is 1
if Line_Nb = 1 then
declare
Caret_Line : String (1 .. End_Col - 1) := (others => ' ');
begin
Caret_Line (Start_Col .. End_Col - 1) := (others => '^');
Line_Starting (Start_Line);
Put_Line
(Output_File, " " & To_UTF8 (Get_Line (Buffer, Start_Line)));
if Start_Col /= End_Col then
Line_Starting (0);
Set_Color (Term_Info, Foreground => Caretting_Color);
Put_Line (Output_File, " " & Caret_Line);
end if;
end;
-- Else display the multiline style
else
declare
Diff : constant Natural := Line_Nb - 2;
Start_Underline : constant String
(1 .. Start_Col) := (others => '_');
End_Undeline : constant String
(1 .. Integer'Max (End_Col - 1, 1)) := (others => '_');
begin
Line_Starting (Start_Line);
Put_Line
(Output_File,
" " & To_UTF8 (Get_Line (Buffer, Start_Line)));
Line_Starting (0);
Set_Color (Term_Info, Foreground => Caretting_Color);
Put_Line (Output_File, " " & Start_Underline & "^");
if Diff > 0 then
Line_Starting (0);
Set_Color (Term_Info, Foreground => Caretting_Color);
Put_Line (Output_File, "|");
Line_Starting (0);
Set_Color (Term_Info, Foreground => Caretting_Color);
Put (Output_File, "|");
Put_Line (Output_File,
" ~~~ " & Stripped_Image (Diff)
& " other lines ~~~");
Line_Starting (0);
Set_Color (Term_Info, Foreground => Caretting_Color);
Put_Line (Output_File, "|");
end if;
Line_Starting (End_Line);
Set_Color (Term_Info, Foreground => Caretting_Color);
Put (Output_File, "|");
Reset_Colors;
Put_Line
(Output_File,
" " & To_UTF8 (Get_Line (Buffer, End_Line)));
Line_Starting (0);
Set_Color (Term_Info, Foreground => Caretting_Color);
Put_Line (Output_File, "|" & End_Undeline & "^");
end;
end if;
Reset_Colors;
end Print_Source_Listing;
----------------------
-- Print_Diagnostic --
----------------------
procedure Print_Diagnostic
(Self : Diagnostic;
Buffer : Text_Buffer_Ifc'Class;
Path : String;
Style : Diagnostic_Style := Default_Diagnostic_Style;
Output_File : File_Type := Standard_Output)
is
begin
if not Colors_Init then
Init_For_Stdout (Term_Info);
Colors_Init := True;
end if;
-- Put `file_name.ext:line:col: error:`
Set_Style (Term_Info, Bright);
Put (Output_File,
Path & ":"
& Stripped_Image (Integer (Self.Sloc_Range.Start_Line)) & ":"
& Stripped_Image
(Integer (Self.Sloc_Range.Start_Column)) & ":");
Set_Color (Term_Info, Foreground => Style.Color);
Put (Output_File, " " & To_UTF8 (To_Text (Style.Label)) & ": ");
Reset_Colors;
-- Put the error message
declare
In_Lang_Entity : Boolean := False;
begin
for C of To_UTF8 (To_Text (Self.Message)) loop
-- Style backtick parts: put everything in `Bright` inbetween
-- backticks.
if C = '`' then
if In_Lang_Entity then
Reset_Colors;
else
Set_Style (Term_Info, Bright);
In_Lang_Entity := False;
end if;
In_Lang_Entity := not In_Lang_Entity;
end if;
Put (Output_File, C);
end loop;
end;
New_Line (Output_File);
-- Put the source sample
Print_Source_Listing (Self.Sloc_Range, Buffer,
Output_File => Output_File,
Caretting_Color => Style.Color);
New_Line (Output_File);
end Print_Diagnostic;
end Gpr_Parser_Support.Diagnostics.Output;
|
zhmu/ananas | Ada | 308 | adb | -- { dg-do compile }
-- { dg-options "-gnatws" }
with System.Machine_Code; use System.Machine_Code;
procedure machine_code1 is
A_Float : Float;
An_Other_Float : Float := -99999.0;
begin
An_Other_Float := An_Other_Float - A_Float;
Asm("", Inputs => (Float'Asm_Input ("m", A_Float)));
end;
|
stcarrez/swagger-ada | Ada | 920 | ads | -----------------------------------------------------------------------
-- openapi -- Support library for OpenAPI code generator
-- Copyright (C) 2017, 2022 Stephane Carrez
-- Written by Stephane Carrez ([email protected])
--
-- Licensed under the Apache License, Version 2.0 (the "License");
-- you may not use this file except in compliance with the License.
-- You may obtain a copy of the License at
--
-- http://www.apache.org/licenses/LICENSE-2.0
--
-- Unless required by applicable law or agreed to in writing, software
-- distributed under the License is distributed on an "AS IS" BASIS,
-- WITHOUT WARRANTIES OR CONDITIONS OF ANY KIND, either express or implied.
-- See the License for the specific language governing permissions and
-- limitations under the License.
-----------------------------------------------------------------------
with OpenAPI;
package Swagger renames OpenAPI;
|
AdaCore/training_material | Ada | 60 | adb | select
T.Stop;
else
Put_Line ("No stop");
end select;
|
sungyeon/drake | Ada | 6,439 | adb | with System.Formatting;
with System.Img_WChar;
with System.Long_Long_Integer_Types;
with System.Val_Char;
with System.Val_Enum;
with System.Value_Errors;
with System.UTF_Conversions;
package body System.Val_WChar is
use type Long_Long_Integer_Types.Word_Unsigned;
use type UTF_Conversions.From_Status_Type;
use type UTF_Conversions.To_Status_Type;
subtype Word_Unsigned is Long_Long_Integer_Types.Word_Unsigned;
procedure Get_Named (
S : String;
Value : out Wide_Character;
Error : out Boolean);
procedure Get_Named (
S : String;
Value : out Wide_Character;
Error : out Boolean) is
begin
if S = Img_WChar.Image_ad then
Value := Wide_Character'Val (16#ad#);
Error := False;
else
declare
C : Character;
begin
Val_Char.Get_Named (S, C, Error);
Value := Wide_Character'Val (Character'Pos (C));
end;
end if;
end Get_Named;
-- implementation
function Value_Wide_Character (Str : String; EM : WC_Encoding_Method)
return Wide_Character
is
pragma Unreferenced (EM);
First : Positive;
Last : Natural;
begin
Val_Enum.Trim (Str, First, Last);
if First + 2 <= Last
and then Str (First) = '''
and then Str (Last) = '''
then
declare
Used_Last : Natural;
Code : UTF_Conversions.UCS_4;
From_Status : UTF_Conversions.From_Status_Type;
To_Status : UTF_Conversions.To_Status_Type;
Result : Wide_String (1 .. 2);
begin
UTF_Conversions.From_UTF_8 (
Str (First + 1 .. Last),
Used_Last,
Code,
From_Status);
if From_Status = UTF_Conversions.Success
and then Used_Last + 1 = Last
then
UTF_Conversions.To_UTF_16 (
Code,
Result,
Used_Last,
To_Status);
if To_Status = UTF_Conversions.Success
and then Used_Last = 1
then
return Result (1);
end if;
end if;
end;
else
declare
S : String := Str (First .. Last);
L : constant Natural := First + (Val_Char.HEX_Prefix'Length - 1);
begin
Val_Enum.To_Upper (S);
if L <= Last and then S (First .. L) = Val_Char.HEX_Prefix then
declare
Used_Last : Natural;
Result : Word_Unsigned;
Error : Boolean;
begin
Formatting.Value (
S (First + Val_Char.HEX_Prefix'Length .. Last),
Used_Last,
Result,
Base => 16,
Error => Error);
if not Error
and then Used_Last = Last
and then Result <=
Wide_Character'Pos (Wide_Character'Last)
then
return Wide_Character'Val (Result);
end if;
end;
else
declare
Result : Wide_Character;
Error : Boolean;
begin
Get_Named (S, Result, Error);
if not Error then
return Result;
end if;
end;
end if;
end;
end if;
Value_Errors.Raise_Discrete_Value_Failure ("Wide_Character", Str);
declare
Uninitialized : Wide_Character;
pragma Unmodified (Uninitialized);
begin
return Uninitialized;
end;
end Value_Wide_Character;
function Value_Wide_Wide_Character (Str : String; EM : WC_Encoding_Method)
return Wide_Wide_Character
is
pragma Unreferenced (EM);
First : Positive;
Last : Natural;
begin
Val_Enum.Trim (Str, First, Last);
if First + 2 <= Last
and then Str (First) = '''
and then Str (Last) = '''
then
declare
Used_Last : Natural;
Code : UTF_Conversions.UCS_4;
From_Status : UTF_Conversions.From_Status_Type;
begin
UTF_Conversions.From_UTF_8 (
Str (First + 1 .. Last),
Used_Last,
Code,
From_Status);
if From_Status = UTF_Conversions.Success
and then Used_Last + 1 = Last
then
return Wide_Wide_Character'Val (Code);
end if;
end;
else
declare
S : String := Str (First .. Last);
L : constant Natural := First + (Val_Char.HEX_Prefix'Length - 1);
begin
Val_Enum.To_Upper (S);
if L <= Last and then S (First .. L) = Val_Char.HEX_Prefix then
declare
Used_Last : Natural;
Result : Word_Unsigned;
Error : Boolean;
begin
Formatting.Value (
S (First + Val_Char.HEX_Prefix'Length .. Last),
Used_Last,
Result,
Base => 16,
Error => Error);
if not Error
and then Used_Last = Last
and then Result <=
Wide_Wide_Character'Pos (Wide_Wide_Character'Last)
then
return Wide_Wide_Character'Val (Result);
end if;
end;
else
declare
Result : Wide_Character;
Error : Boolean;
begin
Get_Named (S, Result, Error);
if not Error then
return Wide_Wide_Character'Val (
Wide_Character'Pos (Result));
end if;
end;
end if;
end;
end if;
Value_Errors.Raise_Discrete_Value_Failure ("Wide_Wide_Character", Str);
declare
Uninitialized : Wide_Wide_Character;
pragma Unmodified (Uninitialized);
begin
return Uninitialized;
end;
end Value_Wide_Wide_Character;
end System.Val_WChar;
|
ekoeppen/STM32_Generic_Ada_Drivers | Ada | 14,475 | ads | -- This spec has been automatically generated from STM32F072x.svd
pragma Restrictions (No_Elaboration_Code);
pragma Ada_2012;
pragma Style_Checks (Off);
with System;
package STM32_SVD.ADC is
pragma Preelaborate;
---------------
-- Registers --
---------------
subtype ISR_ADRDY_Field is STM32_SVD.Bit;
subtype ISR_EOSMP_Field is STM32_SVD.Bit;
subtype ISR_EOC_Field is STM32_SVD.Bit;
subtype ISR_EOS_Field is STM32_SVD.Bit;
subtype ISR_OVR_Field is STM32_SVD.Bit;
subtype ISR_AWD_Field is STM32_SVD.Bit;
-- interrupt and status register
type ISR_Register is record
-- ADC ready
ADRDY : ISR_ADRDY_Field := 16#0#;
-- End of sampling flag
EOSMP : ISR_EOSMP_Field := 16#0#;
-- End of conversion flag
EOC : ISR_EOC_Field := 16#0#;
-- End of sequence flag
EOS : ISR_EOS_Field := 16#0#;
-- ADC overrun
OVR : ISR_OVR_Field := 16#0#;
-- unspecified
Reserved_5_6 : STM32_SVD.UInt2 := 16#0#;
-- Analog watchdog flag
AWD : ISR_AWD_Field := 16#0#;
-- unspecified
Reserved_8_31 : STM32_SVD.UInt24 := 16#0#;
end record
with Volatile_Full_Access, Size => 32,
Bit_Order => System.Low_Order_First;
for ISR_Register use record
ADRDY at 0 range 0 .. 0;
EOSMP at 0 range 1 .. 1;
EOC at 0 range 2 .. 2;
EOS at 0 range 3 .. 3;
OVR at 0 range 4 .. 4;
Reserved_5_6 at 0 range 5 .. 6;
AWD at 0 range 7 .. 7;
Reserved_8_31 at 0 range 8 .. 31;
end record;
subtype IER_ADRDYIE_Field is STM32_SVD.Bit;
subtype IER_EOSMPIE_Field is STM32_SVD.Bit;
subtype IER_EOCIE_Field is STM32_SVD.Bit;
subtype IER_EOSIE_Field is STM32_SVD.Bit;
subtype IER_OVRIE_Field is STM32_SVD.Bit;
subtype IER_AWDIE_Field is STM32_SVD.Bit;
-- interrupt enable register
type IER_Register is record
-- ADC ready interrupt enable
ADRDYIE : IER_ADRDYIE_Field := 16#0#;
-- End of sampling flag interrupt enable
EOSMPIE : IER_EOSMPIE_Field := 16#0#;
-- End of conversion interrupt enable
EOCIE : IER_EOCIE_Field := 16#0#;
-- End of conversion sequence interrupt enable
EOSIE : IER_EOSIE_Field := 16#0#;
-- Overrun interrupt enable
OVRIE : IER_OVRIE_Field := 16#0#;
-- unspecified
Reserved_5_6 : STM32_SVD.UInt2 := 16#0#;
-- Analog watchdog interrupt enable
AWDIE : IER_AWDIE_Field := 16#0#;
-- unspecified
Reserved_8_31 : STM32_SVD.UInt24 := 16#0#;
end record
with Volatile_Full_Access, Size => 32,
Bit_Order => System.Low_Order_First;
for IER_Register use record
ADRDYIE at 0 range 0 .. 0;
EOSMPIE at 0 range 1 .. 1;
EOCIE at 0 range 2 .. 2;
EOSIE at 0 range 3 .. 3;
OVRIE at 0 range 4 .. 4;
Reserved_5_6 at 0 range 5 .. 6;
AWDIE at 0 range 7 .. 7;
Reserved_8_31 at 0 range 8 .. 31;
end record;
subtype CR_ADEN_Field is STM32_SVD.Bit;
subtype CR_ADDIS_Field is STM32_SVD.Bit;
subtype CR_ADSTART_Field is STM32_SVD.Bit;
subtype CR_ADSTP_Field is STM32_SVD.Bit;
subtype CR_ADCAL_Field is STM32_SVD.Bit;
-- control register
type CR_Register is record
-- ADC enable command
ADEN : CR_ADEN_Field := 16#0#;
-- ADC disable command
ADDIS : CR_ADDIS_Field := 16#0#;
-- ADC start conversion command
ADSTART : CR_ADSTART_Field := 16#0#;
-- unspecified
Reserved_3_3 : STM32_SVD.Bit := 16#0#;
-- ADC stop conversion command
ADSTP : CR_ADSTP_Field := 16#0#;
-- unspecified
Reserved_5_30 : STM32_SVD.UInt26 := 16#0#;
-- ADC calibration
ADCAL : CR_ADCAL_Field := 16#0#;
end record
with Volatile_Full_Access, Size => 32,
Bit_Order => System.Low_Order_First;
for CR_Register use record
ADEN at 0 range 0 .. 0;
ADDIS at 0 range 1 .. 1;
ADSTART at 0 range 2 .. 2;
Reserved_3_3 at 0 range 3 .. 3;
ADSTP at 0 range 4 .. 4;
Reserved_5_30 at 0 range 5 .. 30;
ADCAL at 0 range 31 .. 31;
end record;
subtype CFGR1_DMAEN_Field is STM32_SVD.Bit;
subtype CFGR1_DMACFG_Field is STM32_SVD.Bit;
subtype CFGR1_SCANDIR_Field is STM32_SVD.Bit;
subtype CFGR1_RES_Field is STM32_SVD.UInt2;
subtype CFGR1_ALIGN_Field is STM32_SVD.Bit;
subtype CFGR1_EXTSEL_Field is STM32_SVD.UInt3;
subtype CFGR1_EXTEN_Field is STM32_SVD.UInt2;
subtype CFGR1_OVRMOD_Field is STM32_SVD.Bit;
subtype CFGR1_CONT_Field is STM32_SVD.Bit;
subtype CFGR1_AUTDLY_Field is STM32_SVD.Bit;
subtype CFGR1_AUTOFF_Field is STM32_SVD.Bit;
subtype CFGR1_DISCEN_Field is STM32_SVD.Bit;
subtype CFGR1_AWDSGL_Field is STM32_SVD.Bit;
subtype CFGR1_AWDEN_Field is STM32_SVD.Bit;
subtype CFGR1_AWDCH_Field is STM32_SVD.UInt5;
-- configuration register 1
type CFGR1_Register is record
-- Direct memory access enable
DMAEN : CFGR1_DMAEN_Field := 16#0#;
-- Direct memery access configuration
DMACFG : CFGR1_DMACFG_Field := 16#0#;
-- Scan sequence direction
SCANDIR : CFGR1_SCANDIR_Field := 16#0#;
-- Data resolution
RES : CFGR1_RES_Field := 16#0#;
-- Data alignment
ALIGN : CFGR1_ALIGN_Field := 16#0#;
-- External trigger selection
EXTSEL : CFGR1_EXTSEL_Field := 16#0#;
-- unspecified
Reserved_9_9 : STM32_SVD.Bit := 16#0#;
-- External trigger enable and polarity selection
EXTEN : CFGR1_EXTEN_Field := 16#0#;
-- Overrun management mode
OVRMOD : CFGR1_OVRMOD_Field := 16#0#;
-- Single / continuous conversion mode
CONT : CFGR1_CONT_Field := 16#0#;
-- Auto-delayed conversion mode
AUTDLY : CFGR1_AUTDLY_Field := 16#0#;
-- Auto-off mode
AUTOFF : CFGR1_AUTOFF_Field := 16#0#;
-- Discontinuous mode
DISCEN : CFGR1_DISCEN_Field := 16#0#;
-- unspecified
Reserved_17_21 : STM32_SVD.UInt5 := 16#0#;
-- Enable the watchdog on a single channel or on all channels
AWDSGL : CFGR1_AWDSGL_Field := 16#0#;
-- Analog watchdog enable
AWDEN : CFGR1_AWDEN_Field := 16#0#;
-- unspecified
Reserved_24_25 : STM32_SVD.UInt2 := 16#0#;
-- Analog watchdog channel selection
AWDCH : CFGR1_AWDCH_Field := 16#0#;
-- unspecified
Reserved_31_31 : STM32_SVD.Bit := 16#0#;
end record
with Volatile_Full_Access, Size => 32,
Bit_Order => System.Low_Order_First;
for CFGR1_Register use record
DMAEN at 0 range 0 .. 0;
DMACFG at 0 range 1 .. 1;
SCANDIR at 0 range 2 .. 2;
RES at 0 range 3 .. 4;
ALIGN at 0 range 5 .. 5;
EXTSEL at 0 range 6 .. 8;
Reserved_9_9 at 0 range 9 .. 9;
EXTEN at 0 range 10 .. 11;
OVRMOD at 0 range 12 .. 12;
CONT at 0 range 13 .. 13;
AUTDLY at 0 range 14 .. 14;
AUTOFF at 0 range 15 .. 15;
DISCEN at 0 range 16 .. 16;
Reserved_17_21 at 0 range 17 .. 21;
AWDSGL at 0 range 22 .. 22;
AWDEN at 0 range 23 .. 23;
Reserved_24_25 at 0 range 24 .. 25;
AWDCH at 0 range 26 .. 30;
Reserved_31_31 at 0 range 31 .. 31;
end record;
-- CFGR2_JITOFF_D array element
subtype CFGR2_JITOFF_D_Element is STM32_SVD.Bit;
-- CFGR2_JITOFF_D array
type CFGR2_JITOFF_D_Field_Array is array (2 .. 3)
of CFGR2_JITOFF_D_Element
with Component_Size => 1, Size => 2;
-- Type definition for CFGR2_JITOFF_D
type CFGR2_JITOFF_D_Field
(As_Array : Boolean := False)
is record
case As_Array is
when False =>
-- JITOFF_D as a value
Val : STM32_SVD.UInt2;
when True =>
-- JITOFF_D as an array
Arr : CFGR2_JITOFF_D_Field_Array;
end case;
end record
with Unchecked_Union, Size => 2;
for CFGR2_JITOFF_D_Field use record
Val at 0 range 0 .. 1;
Arr at 0 range 0 .. 1;
end record;
-- configuration register 2
type CFGR2_Register is record
-- unspecified
Reserved_0_29 : STM32_SVD.UInt30 := 16#8000#;
-- JITOFF_D2
JITOFF_D : CFGR2_JITOFF_D_Field :=
(As_Array => False, Val => 16#0#);
end record
with Volatile_Full_Access, Size => 32,
Bit_Order => System.Low_Order_First;
for CFGR2_Register use record
Reserved_0_29 at 0 range 0 .. 29;
JITOFF_D at 0 range 30 .. 31;
end record;
subtype SMPR_SMPR_Field is STM32_SVD.UInt3;
-- sampling time register
type SMPR_Register is record
-- Sampling time selection
SMPR : SMPR_SMPR_Field := 16#0#;
-- unspecified
Reserved_3_31 : STM32_SVD.UInt29 := 16#0#;
end record
with Volatile_Full_Access, Size => 32,
Bit_Order => System.Low_Order_First;
for SMPR_Register use record
SMPR at 0 range 0 .. 2;
Reserved_3_31 at 0 range 3 .. 31;
end record;
subtype TR_LT_Field is STM32_SVD.UInt12;
subtype TR_HT_Field is STM32_SVD.UInt12;
-- watchdog threshold register
type TR_Register is record
-- Analog watchdog lower threshold
LT : TR_LT_Field := 16#FFF#;
-- unspecified
Reserved_12_15 : STM32_SVD.UInt4 := 16#0#;
-- Analog watchdog higher threshold
HT : TR_HT_Field := 16#0#;
-- unspecified
Reserved_28_31 : STM32_SVD.UInt4 := 16#0#;
end record
with Volatile_Full_Access, Size => 32,
Bit_Order => System.Low_Order_First;
for TR_Register use record
LT at 0 range 0 .. 11;
Reserved_12_15 at 0 range 12 .. 15;
HT at 0 range 16 .. 27;
Reserved_28_31 at 0 range 28 .. 31;
end record;
-- CHSELR_CHSEL array element
subtype CHSELR_CHSEL_Element is STM32_SVD.Bit;
-- CHSELR_CHSEL array
type CHSELR_CHSEL_Field_Array is array (0 .. 18) of CHSELR_CHSEL_Element
with Component_Size => 1, Size => 19;
-- Type definition for CHSELR_CHSEL
type CHSELR_CHSEL_Field
(As_Array : Boolean := False)
is record
case As_Array is
when False =>
-- CHSEL as a value
Val : STM32_SVD.UInt19;
when True =>
-- CHSEL as an array
Arr : CHSELR_CHSEL_Field_Array;
end case;
end record
with Unchecked_Union, Size => 19;
for CHSELR_CHSEL_Field use record
Val at 0 range 0 .. 18;
Arr at 0 range 0 .. 18;
end record;
-- channel selection register
type CHSELR_Register is record
-- Channel-x selection
CHSEL : CHSELR_CHSEL_Field :=
(As_Array => False, Val => 16#0#);
-- unspecified
Reserved_19_31 : STM32_SVD.UInt13 := 16#0#;
end record
with Volatile_Full_Access, Size => 32,
Bit_Order => System.Low_Order_First;
for CHSELR_Register use record
CHSEL at 0 range 0 .. 18;
Reserved_19_31 at 0 range 19 .. 31;
end record;
subtype DR_DATA_Field is STM32_SVD.UInt16;
-- data register
type DR_Register is record
-- Read-only. Converted data
DATA : DR_DATA_Field;
-- unspecified
Reserved_16_31 : STM32_SVD.UInt16;
end record
with Volatile_Full_Access, Size => 32,
Bit_Order => System.Low_Order_First;
for DR_Register use record
DATA at 0 range 0 .. 15;
Reserved_16_31 at 0 range 16 .. 31;
end record;
subtype CCR_VREFEN_Field is STM32_SVD.Bit;
subtype CCR_TSEN_Field is STM32_SVD.Bit;
subtype CCR_VBATEN_Field is STM32_SVD.Bit;
-- common configuration register
type CCR_Register is record
-- unspecified
Reserved_0_21 : STM32_SVD.UInt22 := 16#0#;
-- Temperature sensor and VREFINT enable
VREFEN : CCR_VREFEN_Field := 16#0#;
-- Temperature sensor enable
TSEN : CCR_TSEN_Field := 16#0#;
-- VBAT enable
VBATEN : CCR_VBATEN_Field := 16#0#;
-- unspecified
Reserved_25_31 : STM32_SVD.UInt7 := 16#0#;
end record
with Volatile_Full_Access, Size => 32,
Bit_Order => System.Low_Order_First;
for CCR_Register use record
Reserved_0_21 at 0 range 0 .. 21;
VREFEN at 0 range 22 .. 22;
TSEN at 0 range 23 .. 23;
VBATEN at 0 range 24 .. 24;
Reserved_25_31 at 0 range 25 .. 31;
end record;
-----------------
-- Peripherals --
-----------------
-- Analog-to-digital converter
type ADC_Peripheral is record
-- interrupt and status register
ISR : aliased ISR_Register;
-- interrupt enable register
IER : aliased IER_Register;
-- control register
CR : aliased CR_Register;
-- configuration register 1
CFGR1 : aliased CFGR1_Register;
-- configuration register 2
CFGR2 : aliased CFGR2_Register;
-- sampling time register
SMPR : aliased SMPR_Register;
-- watchdog threshold register
TR : aliased TR_Register;
-- channel selection register
CHSELR : aliased CHSELR_Register;
-- data register
DR : aliased DR_Register;
-- common configuration register
CCR : aliased CCR_Register;
end record
with Volatile;
for ADC_Peripheral use record
ISR at 16#0# range 0 .. 31;
IER at 16#4# range 0 .. 31;
CR at 16#8# range 0 .. 31;
CFGR1 at 16#C# range 0 .. 31;
CFGR2 at 16#10# range 0 .. 31;
SMPR at 16#14# range 0 .. 31;
TR at 16#20# range 0 .. 31;
CHSELR at 16#28# range 0 .. 31;
DR at 16#40# range 0 .. 31;
CCR at 16#308# range 0 .. 31;
end record;
-- Analog-to-digital converter
ADC_Periph : aliased ADC_Peripheral
with Import, Address => System'To_Address (16#40012400#);
end STM32_SVD.ADC;
|
Fabien-Chouteau/lvgl-ada-examples | Ada | 121 | ads | with Lv.Hal.Indev;
package Test_Theme_1 is
procedure Init (Keyboard_Indev : Lv.Hal.Indev.Indev_T);
end Test_Theme_1;
|
sungyeon/drake | Ada | 3,637 | ads | pragma License (Unrestricted);
-- implementation unit specialized for Windows
with Ada.IO_Exceptions;
with Ada.IO_Modes;
with Ada.Streams;
with System.Native_IO;
with C.wincon;
with C.windef;
package System.Native_Text_IO is
pragma Preelaborate;
subtype Handle_Type is Native_IO.Handle_Type;
-- file management
Default_External : constant Ada.IO_Modes.File_External :=
Ada.IO_Modes.Locale;
Default_New_Line : constant Ada.IO_Modes.File_New_Line :=
Ada.IO_Modes.CR_LF;
type Packed_Form is record
Stream_Form : Native_IO.Packed_Form;
External : Ada.IO_Modes.File_External_Spec;
New_Line : Ada.IO_Modes.File_New_Line_Spec;
end record;
pragma Suppress_Initialization (Packed_Form);
pragma Pack (Packed_Form);
-- read / write
subtype Buffer_Type is String (1 .. 12); -- 2 code-points of UTF-8
subtype DBCS_Buffer_Type is String (1 .. 2);
procedure To_UTF_8 (
Buffer : aliased DBCS_Buffer_Type;
Last : Natural;
Out_Buffer : out Buffer_Type;
Out_Last : out Natural);
procedure To_DBCS (
Buffer : Buffer_Type;
Last : Natural;
Out_Buffer : aliased out DBCS_Buffer_Type;
Out_Last : out Natural);
-- terminal
procedure Terminal_Get (
Handle : Handle_Type;
Item : Address; -- requires 6 bytes at least
Length : Ada.Streams.Stream_Element_Offset;
Out_Length : out Ada.Streams.Stream_Element_Offset); -- -1 when error
procedure Terminal_Get_Immediate (
Handle : Handle_Type;
Item : Address; -- requires 6 bytes at least
Length : Ada.Streams.Stream_Element_Offset;
Out_Length : out Ada.Streams.Stream_Element_Offset); -- -1 when error
procedure Terminal_Put (
Handle : Handle_Type;
Item : Address;
Length : Ada.Streams.Stream_Element_Offset;
Out_Length : out Ada.Streams.Stream_Element_Offset); -- -1 when error
procedure Terminal_Size (
Handle : Handle_Type;
Line_Length, Page_Length : out Natural);
procedure Set_Terminal_Size (
Handle : Handle_Type;
Line_Length, Page_Length : Natural);
procedure Terminal_View (
Handle : Handle_Type;
Left, Top : out Positive;
Right, Bottom : out Natural);
function Use_Terminal_Position (Handle : Handle_Type) return Boolean is
(True);
procedure Terminal_Position (
Handle : Handle_Type;
Col, Line : out Positive);
procedure Set_Terminal_Position (
Handle : Handle_Type;
Col, Line : Positive);
procedure Set_Terminal_Col (
Handle : Handle_Type;
To : Positive);
procedure Terminal_Clear (
Handle : Handle_Type);
subtype Setting is C.windef.DWORD;
procedure Set_Non_Canonical_Mode (
Handle : Handle_Type;
Wait : Boolean; -- unreferenced
Saved_Settings : aliased out Setting);
procedure Restore (
Handle : Handle_Type;
Settings : aliased Setting);
procedure Set_Terminal_Attributes (
Handle : Handle_Type;
Attributes : C.windef.WORD);
type Output_State is record
Position : C.wincon.COORD;
Attributes : C.windef.WORD;
end record;
pragma Suppress_Initialization (Output_State);
procedure Save_State (Handle : Handle_Type; To_State : out Output_State);
procedure Reset_State (Handle : Handle_Type; From_State : Output_State);
-- exceptions
Device_Error : exception
renames Ada.IO_Exceptions.Device_Error;
Data_Error : exception
renames Ada.IO_Exceptions.Data_Error;
Layout_Error : exception
renames Ada.IO_Exceptions.Layout_Error;
end System.Native_Text_IO;
|
osannolik/ada-canopen | Ada | 2,191 | ads | with Ada.Finalization;
generic
type Key_Type is private;
with function "=" (L : Key_Type; R : Key_Type) return Boolean;
with function Hash (Key : Key_Type) return Natural;
type Value_Type is private;
package ACO.Utils.DS.Generic_Table is
pragma Preelaborate;
type Table
(Number_Of_Buckets : Positive;
Maximum_Size : Positive)
is new Ada.Finalization.Controlled with private;
function Length (This : Table) return Natural;
function Is_Full (This : Table) return Boolean;
function Is_Empty (This : Table) return Boolean;
function Is_Bound (This : Table; Key : Key_Type) return Boolean;
procedure Bind
(This : in out Table;
Key : in Key_Type;
Value : in Value_Type)
with Pre => (if not This.Is_Bound (Key) then not This.Is_Full),
Post => This.Is_Bound (Key);
function Value_Of
(This : Table;
Key : Key_Type)
return Value_Type
with Pre => This.Is_Bound (Key);
procedure Unbind
(This : in out Table;
Key : in Key_Type)
with Post => not This.Is_Bound (Key);
private
subtype Index is Natural;
No_Index : constant Index := Index'First;
subtype Cell_Index is Index range No_Index + 1 .. Index'Last;
subtype Bucket_Index is Positive;
type Cell is record
Key : Key_Type;
Value : Value_Type;
Next : Index;
end record;
type Cell_Array is array (Cell_Index range <>) of Cell;
type Bucket_Array is array (Bucket_Index range <>) of Index;
type Table
(Number_Of_Buckets : Positive;
Maximum_Size : Positive)
is new Ada.Finalization.Controlled with record
Buckets : Bucket_Array (1 .. Number_Of_Buckets);
Data : Cell_Array (1 .. Maximum_Size);
Size : Natural;
Unused : Index;
end record;
procedure Initialize (This : in out Table);
procedure Clear (This : in out Table)
with Post => This.Is_Empty;
function To_Bucket_Index (This : Table; Key : Key_Type) return Bucket_Index
with Inline;
function Location (This : Table; Start : Index; Key : Key_Type) return Index;
end ACO.Utils.DS.Generic_Table;
|
likai3g/afmt | Ada | 969 | ads | generic
type Fixed_Point_Type is delta <> digits <>;
package Fmt.Generic_Decimal_Fixed_Point_Argument is
function To_Argument (X : Fixed_Point_Type) return Argument_Type'Class
with Inline;
function "&" (Args : Arguments; X : Fixed_Point_Type) return Arguments
with Inline;
private
type Fixed_Point_Argument_Type is new Argument_Type with record
Value : Fixed_Point_Type;
Width : Natural := 0;
Fill : Character := ' ';
Fore : Natural := Fixed_Point_Type'Fore;
Aft : Natural := Fixed_Point_Type'Aft;
end record;
overriding
procedure Parse (
Self : in out Fixed_Point_Argument_Type;
Edit : String);
overriding
function Get_Length (
Self : in out Fixed_Point_Argument_Type)
return Natural;
overriding
procedure Put (
Self : in out Fixed_Point_Argument_Type;
Edit : String;
To : in out String);
end Fmt.Generic_Decimal_Fixed_Point_Argument;
|
zhmu/ananas | Ada | 5,165 | ads | ------------------------------------------------------------------------------
-- --
-- GNAT RUN-TIME LIBRARY (GNARL) COMPONENTS --
-- --
-- S Y S T E M . I N T E R R U P T _ M A N A G E M E N T --
-- --
-- S p e c --
-- --
-- Copyright (C) 1992-2022, Free Software Foundation, Inc. --
-- --
-- GNARL is free software; you can redistribute it and/or modify it under --
-- terms of the GNU General Public License as published by the Free Soft- --
-- ware Foundation; either version 3, or (at your option) any later ver- --
-- sion. GNAT is distributed in the hope that it will be useful, but WITH- --
-- OUT ANY WARRANTY; without even the implied warranty of MERCHANTABILITY --
-- or FITNESS FOR A PARTICULAR PURPOSE. --
-- --
-- As a special exception under Section 7 of GPL version 3, you are granted --
-- additional permissions described in the GCC Runtime Library Exception, --
-- version 3.1, as published by the Free Software Foundation. --
-- --
-- You should have received a copy of the GNU General Public License and --
-- a copy of the GCC Runtime Library Exception along with this program; --
-- see the files COPYING3 and COPYING.RUNTIME respectively. If not, see --
-- <http://www.gnu.org/licenses/>. --
-- --
-- GNARL was developed by the GNARL team at Florida State University. --
-- Extensive contributions were provided by Ada Core Technologies, Inc. --
-- --
------------------------------------------------------------------------------
-- This is the RTEMS version of this package
-- This package encapsulates and centralizes information about all
-- uses of interrupts (or signals), including the target-dependent
-- mapping of interrupts (or signals) to exceptions.
-- Unlike the original design, System.Interrupt_Management can only
-- be used for tasking systems.
-- PLEASE DO NOT put any subprogram declarations with arguments of
-- type Interrupt_ID into the visible part of this package. The type
-- Interrupt_ID is used to derive the type in Ada.Interrupts, and
-- adding more operations to that type would be illegal according
-- to the Ada Reference Manual. This is the reason why the signals
-- sets are implemented using visible arrays rather than functions.
with System.OS_Interface;
with Interfaces.C;
package System.Interrupt_Management is
pragma Preelaborate;
type Interrupt_Mask is limited private;
type Interrupt_ID is new Interfaces.C.int
range 0 .. System.OS_Interface.Max_Interrupt;
type Interrupt_Set is array (Interrupt_ID) of Boolean;
subtype Signal_ID is Interrupt_ID range 0 .. System.OS_Interface.NSIG - 1;
type Signal_Set is array (Signal_ID) of Boolean;
-- The following objects serve as constants, but are initialized in the
-- body to aid portability. This permits us to use more portable names for
-- interrupts, where distinct names may map to the same interrupt ID
-- value.
-- For example, suppose SIGRARE is a signal that is not defined on all
-- systems, but is always reserved when it is defined. If we have the
-- convention that ID zero is not used for any "real" signals, and SIGRARE
-- = 0 when SIGRARE is not one of the locally supported signals, we can
-- write:
-- Reserved (SIGRARE) := True;
-- and the initialization code will be portable.
Abort_Task_Interrupt : Signal_ID;
-- The signal that is used to implement task abort if an interrupt is used
-- for that purpose. This is one of the reserved signals.
Reserve : Interrupt_Set := (others => False);
-- Reserve (I) is true iff the interrupt I is one that cannot be permitted
-- to be attached to a user handler. The possible reasons are many. For
-- example, it may be mapped to an exception used to implement task abort,
-- or used to implement time delays.
procedure Initialize;
-- Initialize the various variables defined in this package. This procedure
-- must be called before accessing any object from this package and can be
-- called multiple times (only the first call has any effect).
private
type Interrupt_Mask is new System.OS_Interface.sigset_t;
-- In some implementation Interrupt_Mask can be represented as a linked
-- list.
end System.Interrupt_Management;
|
reznikmm/matreshka | Ada | 4,557 | 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_Fo.Border_Attributes is
------------
-- Create --
------------
overriding function Create
(Parameters : not null access Matreshka.DOM_Attributes.Attribute_L2_Parameters)
return Fo_Border_Attribute_Node is
begin
return Self : Fo_Border_Attribute_Node do
Matreshka.ODF_Fo.Constructors.Initialize
(Self'Unchecked_Access,
Parameters.Document,
Matreshka.ODF_String_Constants.Fo_Prefix);
end return;
end Create;
--------------------
-- Get_Local_Name --
--------------------
overriding function Get_Local_Name
(Self : not null access constant Fo_Border_Attribute_Node)
return League.Strings.Universal_String
is
pragma Unreferenced (Self);
begin
return Matreshka.ODF_String_Constants.Border_Attribute;
end Get_Local_Name;
begin
Matreshka.DOM_Documents.Register_Attribute
(Matreshka.ODF_String_Constants.Fo_URI,
Matreshka.ODF_String_Constants.Border_Attribute,
Fo_Border_Attribute_Node'Tag);
end Matreshka.ODF_Fo.Border_Attributes;
|
albertklee/SPARKZumo | Ada | 251 | ads | pragma SPARK_Mode;
with Interfaces.C; use Interfaces.C;
package Proc_Types is
type Register is mod 2 ** 8
with Size => 8;
type Double_Register is mod 2 ** 16
with Size => 16;
subtype Pin_Type is unsigned_char;
end Proc_Types;
|
mfkiwl/ewok-kernel-security-OS | Ada | 1,070 | 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 ewok.tasks_shared;
package ewok.syscalls.gettick
with spark_mode => on
is
procedure svc_gettick
(caller_id : in ewok.tasks_shared.t_task_id;
params : in out t_parameters;
mode : in ewok.tasks_shared.t_task_mode);
end ewok.syscalls.gettick;
|
likai3g/afmt | Ada | 115 | ads | with Fmt.Generic_Signed_Int_Argument;
package Fmt.Integer_Argument is
new Generic_Signed_Int_Argument(Integer);
|
Fabien-Chouteau/lvgl-ada | Ada | 1,151 | ads | with Lv.Objx;
private with System;
package Lv.Group is
type Instance is private;
function Create return Instance;
procedure Del (Group : Instance);
procedure Add_Obj (Group : Instance; Obj : Lv.Objx.Obj_T);
procedure Remove_Obj (Obj : Lv.Objx.Obj_T);
procedure Focus_Obj (Obj : Lv.Objx.Obj_T);
procedure Focus_Next (Group : Instance);
procedure Focus_Prev (Group : Instance);
procedure Focus_Freeze (Group : Instance; En : U_Bool);
function Send_Data (Group : Instance; C : Uint32_T) return Lv.Objx.Res_T;
private
type Instance is new System.Address;
-------------
-- Imports --
-------------
pragma Import (C, Create, "lv_group_create");
pragma Import (C, Del, "lv_group_del");
pragma Import (C, Add_Obj, "lv_group_add_obj");
pragma Import (C, Remove_Obj, "lv_group_remove_obj");
pragma Import (C, Focus_Obj, "lv_group_focus_obj");
pragma Import (C, Focus_Next, "lv_group_focus_next");
pragma Import (C, Focus_Prev, "lv_group_focus_prev");
pragma Import (C, Focus_Freeze, "lv_group_focus_freeze");
pragma Import (C, Send_Data, "lv_group_send_data");
end Lv.Group;
|
reznikmm/matreshka | Ada | 4,257 | 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.Elements.Internals;
package body ODF.DOM.Elements.Text.Outline_Style.Internals is
------------
-- Create --
------------
function Create
(Node : Matreshka.ODF_Elements.Text.Outline_Style.Text_Outline_Style_Access)
return ODF.DOM.Elements.Text.Outline_Style.ODF_Text_Outline_Style is
begin
return
(XML.DOM.Elements.Internals.Create
(Matreshka.DOM_Nodes.Element_Access (Node)) with null record);
end Create;
----------
-- Wrap --
----------
function Wrap
(Node : Matreshka.ODF_Elements.Text.Outline_Style.Text_Outline_Style_Access)
return ODF.DOM.Elements.Text.Outline_Style.ODF_Text_Outline_Style is
begin
return
(XML.DOM.Elements.Internals.Wrap
(Matreshka.DOM_Nodes.Element_Access (Node)) with null record);
end Wrap;
end ODF.DOM.Elements.Text.Outline_Style.Internals;
|
charlie5/lace | Ada | 929 | ads | with
GL.lean,
Interfaces.C.Strings,
System;
package GL.Pointers
--
-- Provides pointer conversions.
--
is
function to_GLvoid_access (From : in system.Address) return access GLvoid;
function to_GLvoid_access (From : access C.unsigned_char) return access GLvoid;
function to_GLchar_access (From : in C.Strings.chars_ptr) return access lean.GLchar;
function to_GLchar_Pointer_access
(From : access C.Strings.chars_ptr_array)
return access lean.GLchar_Pointer;
function "+" (From : in system.Address) return access GLvoid renames to_GLvoid_access;
function "+" (From : access C.unsigned_char) return access GLvoid renames to_GLvoid_access;
function "+" (From : in C.Strings.chars_ptr) return access lean.GLchar renames to_GLchar_access;
end GL.Pointers;
|
adamkruszewski/qweyboard | Ada | 1,097 | ads | with Ada.Containers.Ordered_Sets;
package Keys is
-- Letter keys declared in the order they're likely to appear in words
--
-- Quoted from patent, although not strictly followed here...
--
-- > For example, in English, the initial consonants of the syllable are
-- > ordered according to the following priority scheme or rule: "X, Z, S, B,
-- > P, G, QU, Q, C, D, T, V, W, F, J, H, K, L, M, R, N". The final consonants
-- > are sorted according to the following priority rules: "V, L, M, R, W, N,
-- > G, K, C, X, B, P, H, D, S, E, F, T, Y, Z", where the E is meant as a final
-- > mute "E" at the end of word
type Softkey is
(LZ, LS, LF, LC, LT, LP, LR, LJ, LK, LL, LN,
LE, LO, LI, MY, MA, MU, MAPO, RO, RI, RE,
RN, RL, RK, RJ, RR, RP, RT, RC, RF, RS, RZ,
-- Special keys that exist on the real hardware
MSHI, CAPI, NOSP,
-- Special keys we want (backspace, suspend and "no modifier pressed")
SUSP, NOKEY);
package Key_Sets is new Ada.Containers.Ordered_Sets (Element_Type => Softkey);
end Keys;
|
yannickmoy/SPARKNaCl | Ada | 2,956 | ads | with SPARKNaCl; use SPARKNaCl;
with SPARKNaCl.Sign; use SPARKNaCl.Sign;
with SPARKNaCl.Cryptobox; use SPARKNaCl.Cryptobox;
with SPARKNaCl.Hashing; use SPARKNaCl.Hashing;
with SPARKNaCl.Stream; use SPARKNaCl.Stream;
with SPARKNaCl.Core; use SPARKNaCl.Core;
with Interfaces; use Interfaces;
package TweetNaCl_API
is
GF_Add : Unsigned_64
with Import, Convention => C, Link_Name => "tweet_gf_add";
GF_Sub : Unsigned_64
with Import, Convention => C, Link_Name => "tweet_gf_sub";
GF_Mul : Unsigned_64
with Import, Convention => C, Link_Name => "tweet_gf_mul";
GF_Car : Unsigned_64
with Import, Convention => C, Link_Name => "tweet_gf_car";
procedure Crypto_Sign
(SM : out Byte_Seq;
SMLen : out Unsigned_64;
M : in Byte_Seq;
N : in Unsigned_64;
SK : in Signing_SK)
with Import,
Convention => C,
Link_Name => "crypto_sign_ed25519_tweet";
procedure Crypto_Sign2
(SM : out Byte_Seq;
SMLen : out Unsigned_64;
M : in Byte_Seq;
N : in Unsigned_64;
SK : in Signing_SK;
Hash_SK : out Unsigned_64;
Hash_Reduce_SM1 : out Unsigned_64;
Scalarbase_R : out Unsigned_64;
Pack_P : out Unsigned_64;
Hash_Reduce_SM2 : out Unsigned_64;
Initialize_X : out Unsigned_64;
Assign_X : out Unsigned_64;
ModL_X : out Unsigned_64)
with Import,
Convention => C,
Link_Name => "crypto_sign2_ed25519_tweet";
procedure Crypto_Hash
(SM : out Digest;
M : in Byte_Seq;
N : in Unsigned_64)
with Import,
Convention => C,
Link_Name => "crypto_hash_sha512_tweet";
procedure Crypto_Box
(C : out Byte_Seq;
M : in Byte_Seq;
MLen : in Unsigned_64;
N : in Stream.HSalsa20_Nonce;
Recipient_PK : in Public_Key;
Sender_SK : in Secret_Key)
with Import,
Convention => C,
Link_Name => "crypto_box_curve25519xsalsa20poly1305_tweet";
procedure Reset
with Import,
Convention => C,
Link_Name => "tweet_reset";
procedure Crypto_Scalarmult (Q : out Bytes_32;
N : in Bytes_32;
P : in Bytes_32)
with Import,
Convention => C,
Link_Name => "crypto_scalarmult_curve25519_tweet";
procedure HSalsa20 (C : out Byte_Seq; -- Output stream
CLen : in Unsigned_64;
N : in HSalsa20_Nonce; -- Nonce
K : in Salsa20_Key) -- Key
with Import,
Convention => C,
Link_Name => "crypto_stream_xsalsa20_tweet";
end TweetNaCl_API;
|
sf17k/sdlada | Ada | 4,901 | adb | --------------------------------------------------------------------------------------------------------------------
-- Copyright (c) 2014 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.
--------------------------------------------------------------------------------------------------------------------
private with SDL.C_Pointers;
package body SDL.Inputs.Keyboards is
package C renames Interfaces.C;
function Get_Focus return SDL.Video.Windows.ID is
function SDL_Get_Window_ID (W : in SDL.C_Pointers.Windows_Pointer) return SDL.Video.Windows.ID with
Import => True,
Convention => C,
External_Name => "SDL_GetWindowID";
function SDL_Get_Keyboard_Focus return SDL.C_Pointers.Windows_Pointer with
Import => True,
Convention => C,
External_Name => "SDL_GetKeyboardFocus";
begin
return SDL_Get_Window_ID (SDL_Get_Keyboard_Focus);
end Get_Focus;
function Get_Modifiers return SDL.Events.Keyboards.Key_Modifiers is
function SDL_Get_Mod_State return SDL.Events.Keyboards.Key_Modifiers with
Import => True,
Convention => C,
External_Name => "SDL_GetModState";
begin
return SDL_Get_Mod_State;
end Get_Modifiers;
procedure Set_Modifiers (Modifiers : in SDL.Events.Keyboards.Key_Modifiers) is
procedure SDL_Set_Mod_State (Modifiers : in SDL.Events.Keyboards.Key_Modifiers) with
Import => True,
Convention => C,
External_Name => "SDL_SetModState";
begin
SDL_Set_Mod_State (Modifiers);
end Set_Modifiers;
function Supports_Screen_Keyboard return Boolean is
function SDL_Has_Screen_Keyboard_Support return SDL_Bool with
Import => True,
Convention => C,
External_Name => "SDL_HasScreenKeyboardSupport";
Result : SDL_Bool := SDL_Has_Screen_Keyboard_Support;
begin
if Result = SDL_True then
return True;
end if;
return False;
end Supports_Screen_Keyboard;
function Is_Screen_Keyboard_Visible (Window : in SDL.Video.Windows.Window) return Boolean is
function Get_Internal_Window (Self : in SDL.Video.Windows.Window) return SDL.C_Pointers.Windows_Pointer with
Convention => Ada,
Import => True;
function SDL_Screen_Keyboard_Shown (Window : in SDL.C_Pointers.Windows_Pointer) return SDL_Bool with
Import => True,
Convention => C,
External_Name => "SDL_IsScreenKeyboardShown";
Result : SDL_Bool := SDL_Screen_Keyboard_Shown (Get_Internal_Window (Window));
begin
if Result = SDL_True then
return True;
end if;
return False;
end Is_Screen_Keyboard_Visible;
function Is_Text_Input_Enabled return Boolean is
function SDL_Is_Text_Input_Active return SDL_Bool with
Import => True,
Convention => C,
External_Name => "SDL_IsTextInputActive";
Result : SDL_Bool := SDL_Is_Text_Input_Active;
begin
if Result = SDL_True then
return True;
end if;
return False;
end Is_Text_Input_Enabled;
procedure Set_Text_Input_Rectangle (Rectangle : in SDL.Video.Rectangles.Rectangle) is
procedure SDL_Set_Text_Input_Rect (Rectangle : in SDL.Video.Rectangles.Rectangle) with
Import => True,
Convention => C,
External_Name => "SDL_SetTextInputRect";
begin
SDL_Set_Text_Input_Rect (Rectangle);
end Set_Text_Input_Rectangle;
procedure Start_Text_Input is
procedure SDL_Start_Text_Input with
Import => True,
Convention => C,
External_Name => "SDL_StartTextInput";
begin
SDL_Start_Text_Input;
end Start_Text_Input;
procedure Stop_Text_Input is
procedure SDL_Stop_Text_Input with
Import => True,
Convention => C,
External_Name => "SDL_StopTextInput";
begin
SDL_Stop_Text_Input;
end Stop_Text_Input;
end SDL.Inputs.Keyboards;
|
03florent/leJeuDuPoussePousse | Ada | 4,937 | adb | with entrees_sorties; use entrees_sorties;
procedure programmePrincipale is
--déclaration types etc...
type ValeurCase is (NOIR,BLANC,RIEN);
type Direction is (NOR,SUD,EST,WES);
N:constant Integer:=26;
subtype Intervalle is Integer range 1..N;
type Damier is array (Intervalle,Intervalle) of ValeurCase;
procedure afficherDamier(tab:in Damier;tailleChoisit:In Integer)is
procedure afficherBorneSuperieurOuInferieur(tailleChoisit:IN integer) is
begin
for i in Integer range 1..tailleChoisit loop
put("----");
end loop;
end afficherBorneSuperieurOuInferieur;
procedure afficherCase(x:In ValeurCase) is
begin
if x = RIEN then
put("| ");
else
if x = BLANC then
put("| B ");
else
put("| N ");
end if;
end if;
put("|");
end afficherCase;
procedure afficherSeparation(tailleChoisit:In Integer) is
begin
for i in Integer range 1..tailleChoisit loop
put("-----");
end loop;
end afficherSeparation;
--begin de afficherDamier
begin
afficherSeparation(tailleChoisit);
new_line;
for i in Integer range 1..tailleChoisit loop
for j in Integer range 1..tailleChoisit loop
afficherCase(tab(i,j));
end loop;
new_line;
afficherSeparation(tailleChoisit);
new_line;
end loop;
end afficherDamier;
procedure initialisation(j1,j2:out ValeurCase;indice:out Integer;tailleChoisit:out Integer)is
choixCouleurEnString:String:="BLAN";
--begin d'initialisation
begin
put("quel taille de damier souhaitez vous?");
get(tailleChoisit);
put("le joueur1 veut-il être blanc ou noir? (tapez 'NOIR' ou 'BLAN')");
get(choixCouleurEnString);
put(choixCouleurEnString);
if ValeurCase'image(NOIR)= choixCouleurEnString then
j1:=NOIR;
else
j1:=BLANC;
end if;
if j1 = BLANC then
j2:= NOIR;
else
j2:=BLANC;
end if;
put("qui commence? entrez '1' ou '2' qui correspondent respectivement à joueur 1 et joueur 2 ");
get(indice);
end initialisation;
procedure toursDUnJoueur(tab:in out Damier; joueur:in ValeurCase;tailleChoisit:In Integer) is
procedure insererPion(tab:in out Damier; joueur:in ValeurCase;dir0:in Direction;posInsertion,tailleChoisit:in Integer) is
n:Integer:=1;
pionInserer:Boolean:= False;
--begin de insererPion
begin
case dir0 is
when NOR => while not pionInserer loop
if tab(n,posInsertion) = RIEN or n=tailleChoisit then
while n/=1 loop
tab(n,posInsertion):=tab(n-1,posInsertion);
n:=n-1;
end loop;
tab(n,posInsertion):=joueur;
pionInserer:=TRUE;
else
n:=n+1;
end if;
end loop;
when SUD => while not pionInserer loop
if tab(tailleChoisit-n+1,posInsertion) = RIEN or n=tailleChoisit then
while n/=1 loop
tab(tailleChoisit-(n-1),posInsertion):=tab(tailleChoisit-(n-1-1),posInsertion);-------------------------------------------
n:=n-1;
end loop;
tab(tailleChoisit-n+1,posInsertion):=joueur;
pionInserer:=TRUE;
else
n:=n+1;
end if;
end loop;
when EST => while not pionInserer loop
if tab(posInsertion,tailleChoisit-n+1) = RIEN or n=tailleChoisit then
while n/=1 loop
tab(posInsertion,tailleChoisit-(n-1)):=tab(posInsertion,tailleChoisit-(n-1-1));
n:=n-1;
end loop;
tab(posInsertion,tailleChoisit-n+1):=joueur;
pionInserer:=TRUE;
else
n:=n+1;
end if;
end loop;
when WES => while not pionInserer loop
if tab(posInsertion,n) = RIEN or n=tailleChoisit then
while n/=1 loop
tab(posInsertion,n):=tab(posInsertion,n-1);
n:=n-1;
end loop;
tab(posInsertion,n):=joueur;
pionInserer:=TRUE;
else
n:=n+1;
end if;
end loop;
end case;
end insererPion;
--déclaration tours d'un joueur
dir1:Direction;
posInsertion:Integer;
directionEnCharacter:string:="lol";
--begin du tours d'un joueur
begin
put("DEPUIS quel direction voulez vous inserer le pion? (les directions a taper sont 'SUD' 'NOR' 'EST' 'WES')");
get(directionEnCharacter);
if Direction'image(NOR) = directionEnCharacter then
dir1:=NOR;
elsif Direction'image(SUD) = directionEnCharacter then
dir1:=SUD;
elsif Direction'image(EST) = directionEnCharacter then
dir1:=EST;
else
dir1:=WES;
end if;
put("dans quel case voulez vous l'insérer?");
get(posInsertion);
insererPion(tab,joueur,dir1,posInsertion,tailleChoisit);
end toursDUnJoueur;
--déclaration du programme principale
grille:Damier:=(others=>(others => RIEN));
joueurActuel,joueur1,joueur2:ValeurCase;
tourDuJoueur,tailleGrille:Integer;
finDuJeu:Boolean:=False;
--begin du programme principale
begin
initialisation(joueur1,joueur2,tourDuJoueur,tailleGrille);
afficherDamier(grille,tailleGrille);
while not finDuJeu loop
if tourDuJoueur mod 2 = 0 then
joueurActuel:=joueur2;
else
joueurActuel:=joueur1;
end if;
toursDUnJoueur(grille,joueurActuel,tailleGrille);
afficherDamier(grille,tailleGrille);
tourDuJoueur:=tourDuJoueur+1;
end loop;
end programmePrincipale; |
reznikmm/matreshka | Ada | 4,090 | ads | ------------------------------------------------------------------------------
-- --
-- Matreshka Project --
-- --
-- Ada Modeling Framework --
-- --
-- Runtime Library Component --
-- --
------------------------------------------------------------------------------
-- --
-- Copyright © 2011-2012, Vadim Godunko <[email protected]> --
-- All rights reserved. --
-- --
-- Redistribution and use in source and binary forms, with or without --
-- modification, are permitted provided that the following conditions --
-- are met: --
-- --
-- * Redistributions of source code must retain the above copyright --
-- notice, this list of conditions and the following disclaimer. --
-- --
-- * Redistributions in binary form must reproduce the above copyright --
-- notice, this list of conditions and the following disclaimer in the --
-- documentation and/or other materials provided with the distribution. --
-- --
-- * Neither the name of the Vadim Godunko, IE nor the names of its --
-- contributors may be used to endorse or promote products derived from --
-- this software without specific prior written permission. --
-- --
-- THIS SOFTWARE IS PROVIDED BY THE COPYRIGHT HOLDERS AND CONTRIBUTORS --
-- "AS IS" AND ANY EXPRESS OR IMPLIED WARRANTIES, INCLUDING, BUT NOT --
-- LIMITED TO, THE IMPLIED WARRANTIES OF MERCHANTABILITY AND FITNESS FOR --
-- A PARTICULAR PURPOSE ARE DISCLAIMED. IN NO EVENT SHALL THE COPYRIGHT --
-- HOLDER OR CONTRIBUTORS BE LIABLE FOR ANY DIRECT, INDIRECT, INCIDENTAL, --
-- SPECIAL, EXEMPLARY, OR CONSEQUENTIAL DAMAGES (INCLUDING, BUT NOT LIMITED --
-- TO, PROCUREMENT OF SUBSTITUTE GOODS OR SERVICES; LOSS OF USE, DATA, OR --
-- PROFITS; OR BUSINESS INTERRUPTION) HOWEVER CAUSED AND ON ANY THEORY OF --
-- LIABILITY, WHETHER IN CONTRACT, STRICT LIABILITY, OR TORT (INCLUDING --
-- NEGLIGENCE OR OTHERWISE) ARISING IN ANY WAY OUT OF THE USE OF THIS --
-- SOFTWARE, EVEN IF ADVISED OF THE POSSIBILITY OF SUCH DAMAGE. --
-- --
------------------------------------------------------------------------------
-- $Revision$ $Date$
------------------------------------------------------------------------------
-- This file is generated, don't edit it.
------------------------------------------------------------------------------
-- An execution environment is a node that offers an execution environment
-- for specific types of components that are deployed on it in the form of
-- executable artifacts.
------------------------------------------------------------------------------
with AMF.UML.Nodes;
package AMF.UML.Execution_Environments is
pragma Preelaborate;
type UML_Execution_Environment is limited interface
and AMF.UML.Nodes.UML_Node;
type UML_Execution_Environment_Access is
access all UML_Execution_Environment'Class;
for UML_Execution_Environment_Access'Storage_Size use 0;
end AMF.UML.Execution_Environments;
|
AdaCore/training_material | Ada | 6,021 | ads | pragma Ada_2005;
pragma Style_Checks (Off);
with Interfaces.C; use Interfaces.C;
with SDL_SDL_stdinc_h;
with System;
with Interfaces.C.Strings;
limited with SDL_SDL_rwops_h;
package SDL_SDL_audio_h is
AUDIO_U8 : constant := 16#0008#; -- ../include/SDL/SDL_audio.h:100
AUDIO_S8 : constant := 16#8008#; -- ../include/SDL/SDL_audio.h:101
AUDIO_U16LSB : constant := 16#0010#; -- ../include/SDL/SDL_audio.h:102
AUDIO_S16LSB : constant := 16#8010#; -- ../include/SDL/SDL_audio.h:103
AUDIO_U16MSB : constant := 16#1010#; -- ../include/SDL/SDL_audio.h:104
AUDIO_S16MSB : constant := 16#9010#; -- ../include/SDL/SDL_audio.h:105
-- unsupported macro: AUDIO_U16 AUDIO_U16LSB
-- unsupported macro: AUDIO_S16 AUDIO_S16LSB
-- unsupported macro: AUDIO_U16SYS AUDIO_U16LSB
-- unsupported macro: AUDIO_S16SYS AUDIO_S16LSB
-- arg-macro: procedure SDL_LoadWAV (file, spec, audSDL_LoadWAV_RW(SDL_RWFromFile(file, "rb"),1, spec,audio_buf,audio_len)
-- SDL_LoadWAV_RW(SDL_RWFromFile(file, "rb"),1, spec,audio_buf,audio_len)
SDL_MIX_MAXVOLUME : constant := 128; -- ../include/SDL/SDL_audio.h:250
type SDL_AudioSpec is record
freq : aliased int; -- ../include/SDL/SDL_audio.h:75
format : aliased SDL_SDL_stdinc_h.Uint16; -- ../include/SDL/SDL_audio.h:76
channels : aliased SDL_SDL_stdinc_h.Uint8; -- ../include/SDL/SDL_audio.h:77
silence : aliased SDL_SDL_stdinc_h.Uint8; -- ../include/SDL/SDL_audio.h:78
samples : aliased SDL_SDL_stdinc_h.Uint16; -- ../include/SDL/SDL_audio.h:79
padding : aliased SDL_SDL_stdinc_h.Uint16; -- ../include/SDL/SDL_audio.h:80
size : aliased SDL_SDL_stdinc_h.Uint32; -- ../include/SDL/SDL_audio.h:81
callback : access procedure
(arg1 : System.Address;
arg2 : access SDL_SDL_stdinc_h.Uint8;
arg3 : int); -- ../include/SDL/SDL_audio.h:91
userdata : System.Address; -- ../include/SDL/SDL_audio.h:92
end record;
pragma Convention (C_Pass_By_Copy, SDL_AudioSpec); -- ../include/SDL/SDL_audio.h:74
type SDL_AudioCVT_filters_array is array (0 .. 9) of access procedure (arg1 : System.Address; arg2 : SDL_SDL_stdinc_h.Uint16);
type SDL_AudioCVT is record
needed : aliased int; -- ../include/SDL/SDL_audio.h:127
src_format : aliased SDL_SDL_stdinc_h.Uint16; -- ../include/SDL/SDL_audio.h:128
dst_format : aliased SDL_SDL_stdinc_h.Uint16; -- ../include/SDL/SDL_audio.h:129
rate_incr : aliased double; -- ../include/SDL/SDL_audio.h:130
buf : access SDL_SDL_stdinc_h.Uint8; -- ../include/SDL/SDL_audio.h:131
len : aliased int; -- ../include/SDL/SDL_audio.h:132
len_cvt : aliased int; -- ../include/SDL/SDL_audio.h:133
len_mult : aliased int; -- ../include/SDL/SDL_audio.h:134
len_ratio : aliased double; -- ../include/SDL/SDL_audio.h:135
filters : aliased SDL_AudioCVT_filters_array; -- ../include/SDL/SDL_audio.h:136
filter_index : aliased int; -- ../include/SDL/SDL_audio.h:137
end record;
pragma Convention (C_Pass_By_Copy, SDL_AudioCVT); -- ../include/SDL/SDL_audio.h:126
function SDL_AudioInit (driver_name : Interfaces.C.Strings.chars_ptr) return int; -- ../include/SDL/SDL_audio.h:150
pragma Import (C, SDL_AudioInit, "SDL_AudioInit");
procedure SDL_AudioQuit; -- ../include/SDL/SDL_audio.h:151
pragma Import (C, SDL_AudioQuit, "SDL_AudioQuit");
function SDL_AudioDriverName (namebuf : Interfaces.C.Strings.chars_ptr; maxlen : int) return Interfaces.C.Strings.chars_ptr; -- ../include/SDL/SDL_audio.h:159
pragma Import (C, SDL_AudioDriverName, "SDL_AudioDriverName");
function SDL_OpenAudio (desired : access SDL_AudioSpec; obtained : access SDL_AudioSpec) return int; -- ../include/SDL/SDL_audio.h:178
pragma Import (C, SDL_OpenAudio, "SDL_OpenAudio");
type SDL_audiostatus is
(SDL_AUDIO_STOPPED,
SDL_AUDIO_PLAYING,
SDL_AUDIO_PAUSED);
pragma Convention (C, SDL_audiostatus); -- ../include/SDL/SDL_audio.h:184
function SDL_GetAudioStatus return SDL_audiostatus; -- ../include/SDL/SDL_audio.h:187
pragma Import (C, SDL_GetAudioStatus, "SDL_GetAudioStatus");
procedure SDL_PauseAudio (pause_on : int); -- ../include/SDL/SDL_audio.h:196
pragma Import (C, SDL_PauseAudio, "SDL_PauseAudio");
function SDL_LoadWAV_RW
(src : access SDL_SDL_rwops_h.SDL_RWops;
freesrc : int;
spec : access SDL_AudioSpec;
audio_buf : System.Address;
audio_len : access SDL_SDL_stdinc_h.Uint32) return access SDL_AudioSpec; -- ../include/SDL/SDL_audio.h:215
pragma Import (C, SDL_LoadWAV_RW, "SDL_LoadWAV_RW");
procedure SDL_FreeWAV (audio_buf : access SDL_SDL_stdinc_h.Uint8); -- ../include/SDL/SDL_audio.h:224
pragma Import (C, SDL_FreeWAV, "SDL_FreeWAV");
function SDL_BuildAudioCVT
(cvt : access SDL_AudioCVT;
src_format : SDL_SDL_stdinc_h.Uint16;
src_channels : SDL_SDL_stdinc_h.Uint8;
src_rate : int;
dst_format : SDL_SDL_stdinc_h.Uint16;
dst_channels : SDL_SDL_stdinc_h.Uint8;
dst_rate : int) return int; -- ../include/SDL/SDL_audio.h:234
pragma Import (C, SDL_BuildAudioCVT, "SDL_BuildAudioCVT");
function SDL_ConvertAudio (cvt : access SDL_AudioCVT) return int; -- ../include/SDL/SDL_audio.h:247
pragma Import (C, SDL_ConvertAudio, "SDL_ConvertAudio");
procedure SDL_MixAudio
(dst : access SDL_SDL_stdinc_h.Uint8;
src : access SDL_SDL_stdinc_h.Uint8;
len : SDL_SDL_stdinc_h.Uint32;
volume : int); -- ../include/SDL/SDL_audio.h:258
pragma Import (C, SDL_MixAudio, "SDL_MixAudio");
procedure SDL_LockAudio; -- ../include/SDL/SDL_audio.h:268
pragma Import (C, SDL_LockAudio, "SDL_LockAudio");
procedure SDL_UnlockAudio; -- ../include/SDL/SDL_audio.h:269
pragma Import (C, SDL_UnlockAudio, "SDL_UnlockAudio");
procedure SDL_CloseAudio; -- ../include/SDL/SDL_audio.h:275
pragma Import (C, SDL_CloseAudio, "SDL_CloseAudio");
end SDL_SDL_audio_h;
|
reznikmm/matreshka | Ada | 4,599 | 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.Change_Id_Attributes is
------------
-- Create --
------------
overriding function Create
(Parameters : not null access Matreshka.DOM_Attributes.Attribute_L2_Parameters)
return Text_Change_Id_Attribute_Node is
begin
return Self : Text_Change_Id_Attribute_Node do
Matreshka.ODF_Text.Constructors.Initialize
(Self'Unchecked_Access,
Parameters.Document,
Matreshka.ODF_String_Constants.Text_Prefix);
end return;
end Create;
--------------------
-- Get_Local_Name --
--------------------
overriding function Get_Local_Name
(Self : not null access constant Text_Change_Id_Attribute_Node)
return League.Strings.Universal_String
is
pragma Unreferenced (Self);
begin
return Matreshka.ODF_String_Constants.Change_Id_Attribute;
end Get_Local_Name;
begin
Matreshka.DOM_Documents.Register_Attribute
(Matreshka.ODF_String_Constants.Text_URI,
Matreshka.ODF_String_Constants.Change_Id_Attribute,
Text_Change_Id_Attribute_Node'Tag);
end Matreshka.ODF_Text.Change_Id_Attributes;
|
gerr135/gnat_bugs | Ada | 822 | adb | --
-- Short demo of the bug inducing code: tagged hierarchy as a field of discriminated record
--
-- 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.
--
with lists.Fixed;
procedure bug_03_minimal is
package PL is new Lists(Natural, Integer);
package PLF is new PL.Fixed;
type FRec5 is record
f : PLF.List(5);
end record;
type FRec (N : Positive) is record
f : PLF.List(N);
end record;
lf : PLF.List(5);
lfr5 : FRec5;
lfr : FRec(5);
begin
lf(1) := 1;
lfr5.f(1) := 1; -- this is still fine
lfr.f(1) := 1; -- this triggers the bug
end bug_03_minimal;
|
reznikmm/matreshka | Ada | 6,918 | 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_Db.Driver_Settings_Elements is
------------
-- Create --
------------
overriding function Create
(Parameters : not null access Matreshka.DOM_Elements.Element_L2_Parameters)
return Db_Driver_Settings_Element_Node is
begin
return Self : Db_Driver_Settings_Element_Node do
Matreshka.ODF_Db.Constructors.Initialize
(Self'Unchecked_Access,
Parameters.Document,
Matreshka.ODF_String_Constants.Db_Prefix);
end return;
end Create;
----------------
-- Enter_Node --
----------------
overriding procedure Enter_Node
(Self : not null access Db_Driver_Settings_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_Db_Driver_Settings
(ODF.DOM.Db_Driver_Settings_Elements.ODF_Db_Driver_Settings_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 Db_Driver_Settings_Element_Node)
return League.Strings.Universal_String
is
pragma Unreferenced (Self);
begin
return Matreshka.ODF_String_Constants.Driver_Settings_Element;
end Get_Local_Name;
----------------
-- Leave_Node --
----------------
overriding procedure Leave_Node
(Self : not null access Db_Driver_Settings_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_Db_Driver_Settings
(ODF.DOM.Db_Driver_Settings_Elements.ODF_Db_Driver_Settings_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 Db_Driver_Settings_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_Db_Driver_Settings
(Visitor,
ODF.DOM.Db_Driver_Settings_Elements.ODF_Db_Driver_Settings_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.Db_URI,
Matreshka.ODF_String_Constants.Driver_Settings_Element,
Db_Driver_Settings_Element_Node'Tag);
end Matreshka.ODF_Db.Driver_Settings_Elements;
|
clairvoyant/anagram | Ada | 788 | ads | -- Copyright (c) 2010-2017 Maxim Reznik <[email protected]>
--
-- SPDX-License-Identifier: MIT
-- License-Filename: LICENSE
-------------------------------------------------------------
with Anagram.Grammars;
package Anagram.Grammars_Checks is
function Is_L_Attributed
(Self : Anagram.Grammars.Grammar)
return Boolean;
-- All inherited attributes of a part at right hand side depends only on
-- inherited attributes on left hand side or
-- attributes of 'prefix' of the part.
function Is_Well_Formed
(Self : Anagram.Grammars.Grammar;
Verbose : Boolean)
return Boolean;
-- Each production has exactly one rule for each LHS synthesized attribute
-- and for each RHS symbols' inherited attribute
end Anagram.Grammars_Checks;
|
charlie5/cBound | Ada | 1,824 | ads | -- This file is generated by SWIG. Please do not modify by hand.
--
with Interfaces;
with swig;
with Interfaces.C;
with Interfaces.C.Pointers;
package xcb.xcb_glx_query_extensions_string_reply_t is
-- Item
--
type Item is record
response_type : aliased Interfaces.Unsigned_8;
pad0 : aliased Interfaces.Unsigned_8;
sequence : aliased Interfaces.Unsigned_16;
length : aliased Interfaces.Unsigned_32;
pad1 : aliased swig.int8_t_Array (0 .. 3);
n : aliased Interfaces.Unsigned_32;
pad2 : aliased swig.int8_t_Array (0 .. 15);
end record;
-- Item_Array
--
type Item_Array is
array
(Interfaces.C
.size_t range <>) of aliased xcb
.xcb_glx_query_extensions_string_reply_t
.Item;
-- Pointer
--
package C_Pointers is new Interfaces.C.Pointers
(Index => Interfaces.C.size_t,
Element => xcb.xcb_glx_query_extensions_string_reply_t.Item,
Element_Array => xcb.xcb_glx_query_extensions_string_reply_t.Item_Array,
Default_Terminator => (others => <>));
subtype Pointer is C_Pointers.Pointer;
-- Pointer_Array
--
type Pointer_Array is
array
(Interfaces.C
.size_t range <>) of aliased xcb
.xcb_glx_query_extensions_string_reply_t
.Pointer;
-- Pointer_Pointer
--
package C_Pointer_Pointers is new Interfaces.C.Pointers
(Index => Interfaces.C.size_t,
Element => xcb.xcb_glx_query_extensions_string_reply_t.Pointer,
Element_Array =>
xcb.xcb_glx_query_extensions_string_reply_t.Pointer_Array,
Default_Terminator => null);
subtype Pointer_Pointer is C_Pointer_Pointers.Pointer;
end xcb.xcb_glx_query_extensions_string_reply_t;
|
jscparker/math_packages | Ada | 6,011 | adb |
-- Test LU decomposition on a real valued square matrix.
with Ada.Numerics.Generic_elementary_functions;
with Crout_LU;
with Text_IO; use Text_IO;
with Test_Matrices;
procedure crout_lu_tst_1 is
type Real is digits 15;
type Index is range 0..69;
Starting_Index : constant Index := Index'First + 0;
Final_Index : Index := Index'Last - 0;
type Matrix is array(Index, Index) of Real;
type Real_Extended is digits 18;
-- use 18 on Intel for better error estimates.
package math is new Ada.Numerics.Generic_elementary_functions(Real); --for Sqrt
use math;
package lu is new crout_lu (Real, Index, Matrix);
use lu;
package rio is new Float_IO(Real);
use rio;
package iio is new Integer_IO(Integer);
use iio;
package Make_Square_Matrix is new Test_Matrices (Real, Index, Matrix);
use Make_Square_Matrix;
e_Sum : Real_Extended;
Sum : Real;
Permute : Rearrangement;
Scale : Scale_Vectors;
Zero : constant Real := +0.0;
One : constant Real := +1.0;
Two : constant Real := +2.0;
Min_Allowed_Real : constant Real := Two**(Real'Machine_Emin - Real'Machine_Emin / 8);
Zero_Vector : constant Row_Vector := (others => Zero);
A, A_LU, Err, L, U : Matrix := (others => (others => Zero));
Relative_Err : Real;
IO_Final_Index : Integer := 4;
Scale_the_Matrix : constant Boolean := True;
-----------
-- Pause --
-----------
procedure Pause (s1,s2,s3,s4,s5,s6,s7,s8 : string := "") is
Continue : Character := ' ';
begin
New_Line;
if S1 /= "" then put_line (S1); end if;
if S2 /= "" then put_line (S2); end if;
if S3 /= "" then put_line (S3); end if;
if S4 /= "" then put_line (S4); end if;
if S5 /= "" then put_line (S5); end if;
if S6 /= "" then put_line (S6); end if;
if S7 /= "" then put_line (S7); end if;
if S8 /= "" then put_line (S8); end if;
new_line;
begin
put ("Enter a character to continue: ");
get_immediate (Continue);
new_line;
exception
when others => null;
end;
end pause;
--------------------
-- Frobenius_Norm --
--------------------
function Frobenius_Norm
(A : in Matrix;
Final_Row : in Index := Final_Index;
Final_Col : in Index := Final_Index;
Starting_Row : in Index := Starting_Index;
Starting_Col : in Index := Starting_Index)
return Real
is
Max_A_Val : Real := Zero;
Sum, Scaling, tmp : Real := Zero;
begin
Max_A_Val := Zero;
for Row in Starting_Row .. Final_Row loop
for Col in Starting_Col .. Final_Col loop
if Max_A_Val < Abs A(Row, Col) then Max_A_Val := Abs A(Row, Col); end if;
end loop;
end loop;
Scaling := One / (Max_A_Val + Min_Allowed_Real);
Sum := Zero;
for Row in Starting_Row .. Final_Row loop
for Col in Starting_Col .. Final_Col loop
tmp := Scaling * A(Row, Col);
Sum := Sum + tmp * tmp;
end loop;
end loop;
return Sqrt (Sum) * Max_A_Val;
end Frobenius_Norm;
begin
put("Maximum matrix size is "&
Integer'Image (Zero_Vector'length-(Integer(Starting_Index)-Integer(Index'First))));
new_Line;
put("Input Size Of Matrix To Invert (enter an Integer)"); new_Line;
get(IO_Final_Index);
Final_Index := Index (Integer(Starting_Index) + IO_Final_Index - 1);
Pause(
"Test1: LU Decomposition of matrix A = P*L*U, where P is the permutation",
"matrix that comes from Row pivoting. If 15 digit Reals are used, then we",
"expect the error in the calculation of A = P*L*U to be (hopefully) a few",
"parts per 10**15. In other words ||P*L*U - A|| / ||A|| should be a few",
"multiples of 10**(-15). Here |*| denotes the Frobenius Norm. Other matrix",
"norms give slightly different answers, so its an order of magnitude estimate.",
" ",
"Note: LU Decomp. with row pivoting always fails on (large) Peters_2 matrices."
);
new_line;
for Chosen_Matrix in Matrix_id loop
put("For matrix of type "); put(Matrix_id'Image(Chosen_Matrix)); Put(":");
new_line;
-- Get A:
Init_Matrix (A, Chosen_Matrix, Starting_Index, Final_Index);
-- Get A = P * L * U:
A_LU := A;
LU_decompose
(A => A_LU,
Scalings => Scale,
Row_Permutation => Permute,
Final_Index => Final_Index,
Starting_Index => Starting_Index,
Scaling_Desired => Scale_the_Matrix);
-- if matrix A was scaled, then the L*U equals the scaled A.
if Scale_the_Matrix then
Scale_Cols_Then_Rows
(A => A,
Scalings => Scale,
Final_Index => Final_Index,
Starting_Index => Starting_Index);
end if;
for Row in Index loop
for Col in Row .. Index'Last loop
U(Row, Col) := A_LU(Row, Col);
end loop;
end loop;
for Col in Index loop
for Row in Col .. Index'Last loop
L(Row, Col) := A_LU(Row, Col);
end loop;
end loop;
for Col in Index loop
L(Col, Col) := One;
end loop;
-- Multiply Original L and U as test. Get Max error:
for I in Starting_Index .. Final_Index loop
for J in Starting_Index .. Final_Index loop
e_Sum := +0.0;
for K in Starting_Index .. Final_Index loop
e_Sum := e_Sum + Real_Extended (L(I, K)) * Real_Extended (U(K, J));
end loop;
Sum:= Real(e_Sum);
-- Product(I,J) := Sum;
-- Calculate the error:
Err(i, j) := Sum - A(Permute(i), j);
end loop;
end loop;
Relative_Err := Frobenius_Norm (Err) / (Frobenius_Norm (A) + Min_Allowed_Real);
put(" Err in A - P*L*U is ~ ||A - P*L*U|| / ||A|| =");
put(Relative_Err);
new_line;
end loop; -- Matrix_id
end;
|
zhmu/ananas | Ada | 134 | ads | with overload2_q;
package overload2_p is
type t is new overload2_q.t;
private
function "=" (this, that: t) return boolean;
end;
|
pchapin/acrypto | Ada | 12,601 | adb | ---------------------------------------------------------------------------
-- FILE : aco-crypto-algorithms-aes.adb
-- SUBJECT : Body of a package holding the raw AES algorithm.
-- AUTHOR : (C) Copyright 2014 by Peter Chapin
--
-- Please send comments or bug reports to
--
-- Peter Chapin <[email protected]>
---------------------------------------------------------------------------
pragma SPARK_Mode(On);
with ACO.Quadruple_Octet_Operations;
package body ACO.Crypto.Algorithms.AES is
type S_Box_Type is array(ACO.Octet) of ACO.Octet;
S_Box : constant S_Box_Type := S_Box_Type'
(16#63#, 16#7c#, 16#77#, 16#7b#, 16#f2#, 16#6b#, 16#6f#, 16#c5#,
16#30#, 16#01#, 16#67#, 16#2b#, 16#fe#, 16#d7#, 16#ab#, 16#76#,
16#ca#, 16#82#, 16#c9#, 16#7d#, 16#fa#, 16#59#, 16#47#, 16#f0#,
16#ad#, 16#d4#, 16#a2#, 16#af#, 16#9c#, 16#a4#, 16#72#, 16#c0#,
16#b7#, 16#fd#, 16#93#, 16#26#, 16#36#, 16#3f#, 16#f7#, 16#cc#,
16#34#, 16#a5#, 16#e5#, 16#f1#, 16#71#, 16#d8#, 16#31#, 16#15#,
16#04#, 16#c7#, 16#23#, 16#c3#, 16#18#, 16#96#, 16#05#, 16#9a#,
16#07#, 16#12#, 16#80#, 16#e2#, 16#eb#, 16#27#, 16#b2#, 16#75#,
16#09#, 16#83#, 16#2c#, 16#1a#, 16#1b#, 16#6e#, 16#5a#, 16#a0#,
16#52#, 16#3b#, 16#d6#, 16#b3#, 16#29#, 16#e3#, 16#2f#, 16#84#,
16#53#, 16#d1#, 16#00#, 16#ed#, 16#20#, 16#fc#, 16#b1#, 16#5b#,
16#6a#, 16#cb#, 16#be#, 16#39#, 16#4a#, 16#4c#, 16#58#, 16#cf#,
16#d0#, 16#ef#, 16#aa#, 16#fb#, 16#43#, 16#4d#, 16#33#, 16#85#,
16#45#, 16#f9#, 16#02#, 16#7f#, 16#50#, 16#3c#, 16#9f#, 16#a8#,
16#51#, 16#a3#, 16#40#, 16#8f#, 16#92#, 16#9d#, 16#38#, 16#f5#,
16#bc#, 16#b6#, 16#da#, 16#21#, 16#10#, 16#ff#, 16#f3#, 16#d2#,
16#cd#, 16#0c#, 16#13#, 16#ec#, 16#5f#, 16#97#, 16#44#, 16#17#,
16#c4#, 16#a7#, 16#7e#, 16#3d#, 16#64#, 16#5d#, 16#19#, 16#73#,
16#60#, 16#81#, 16#4f#, 16#dc#, 16#22#, 16#2a#, 16#90#, 16#88#,
16#46#, 16#ee#, 16#b8#, 16#14#, 16#de#, 16#5e#, 16#0b#, 16#db#,
16#e0#, 16#32#, 16#3a#, 16#0a#, 16#49#, 16#06#, 16#24#, 16#5c#,
16#c2#, 16#d3#, 16#ac#, 16#62#, 16#91#, 16#95#, 16#e4#, 16#79#,
16#e7#, 16#c8#, 16#37#, 16#6d#, 16#8d#, 16#d5#, 16#4e#, 16#a9#,
16#6c#, 16#56#, 16#f4#, 16#ea#, 16#65#, 16#7a#, 16#ae#, 16#08#,
16#ba#, 16#78#, 16#25#, 16#2e#, 16#1c#, 16#a6#, 16#b4#, 16#c6#,
16#e8#, 16#dd#, 16#74#, 16#1f#, 16#4b#, 16#bd#, 16#8b#, 16#8a#,
16#70#, 16#3e#, 16#b5#, 16#66#, 16#48#, 16#03#, 16#f6#, 16#0e#,
16#61#, 16#35#, 16#57#, 16#b9#, 16#86#, 16#c1#, 16#1d#, 16#9e#,
16#e1#, 16#f8#, 16#98#, 16#11#, 16#69#, 16#d9#, 16#8e#, 16#94#,
16#9b#, 16#1e#, 16#87#, 16#e9#, 16#ce#, 16#55#, 16#28#, 16#df#,
16#8c#, 16#a1#, 16#89#, 16#0d#, 16#bf#, 16#e6#, 16#42#, 16#68#,
16#41#, 16#99#, 16#2d#, 16#0f#, 16#b0#, 16#54#, 16#bb#, 16#16#);
Inverse_S_Box : constant S_Box_Type := S_Box_Type'
(16#52#, 16#09#, 16#6a#, 16#d5#, 16#30#, 16#36#, 16#a5#, 16#38#,
16#bf#, 16#40#, 16#a3#, 16#9e#, 16#81#, 16#f3#, 16#d7#, 16#fb#,
16#7c#, 16#e3#, 16#39#, 16#82#, 16#9b#, 16#2f#, 16#ff#, 16#87#,
16#34#, 16#8e#, 16#43#, 16#44#, 16#c4#, 16#de#, 16#e9#, 16#cb#,
16#54#, 16#7b#, 16#94#, 16#32#, 16#a6#, 16#c2#, 16#23#, 16#3d#,
16#ee#, 16#4c#, 16#95#, 16#0b#, 16#42#, 16#fa#, 16#c3#, 16#4e#,
16#08#, 16#2e#, 16#a1#, 16#66#, 16#28#, 16#d9#, 16#24#, 16#b2#,
16#76#, 16#5b#, 16#a2#, 16#49#, 16#6d#, 16#8b#, 16#d1#, 16#25#,
16#72#, 16#f8#, 16#f6#, 16#64#, 16#86#, 16#68#, 16#98#, 16#16#,
16#d4#, 16#a4#, 16#5c#, 16#cc#, 16#5d#, 16#65#, 16#b6#, 16#92#,
16#6c#, 16#70#, 16#48#, 16#50#, 16#fd#, 16#ed#, 16#b9#, 16#da#,
16#5e#, 16#15#, 16#46#, 16#57#, 16#a7#, 16#8d#, 16#9d#, 16#84#,
16#90#, 16#d8#, 16#ab#, 16#00#, 16#8c#, 16#bc#, 16#d3#, 16#0a#,
16#f7#, 16#e4#, 16#58#, 16#05#, 16#b8#, 16#b3#, 16#45#, 16#06#,
16#d0#, 16#2c#, 16#1e#, 16#8f#, 16#ca#, 16#3f#, 16#0f#, 16#02#,
16#c1#, 16#af#, 16#bd#, 16#03#, 16#01#, 16#13#, 16#8a#, 16#6b#,
16#3a#, 16#91#, 16#11#, 16#41#, 16#4f#, 16#67#, 16#dc#, 16#ea#,
16#97#, 16#f2#, 16#cf#, 16#ce#, 16#f0#, 16#b4#, 16#e6#, 16#73#,
16#96#, 16#ac#, 16#74#, 16#22#, 16#e7#, 16#ad#, 16#35#, 16#85#,
16#e2#, 16#f9#, 16#37#, 16#e8#, 16#1c#, 16#75#, 16#df#, 16#6e#,
16#47#, 16#f1#, 16#1a#, 16#71#, 16#1d#, 16#29#, 16#c5#, 16#89#,
16#6f#, 16#b7#, 16#62#, 16#0e#, 16#aa#, 16#18#, 16#be#, 16#1b#,
16#fc#, 16#56#, 16#3e#, 16#4b#, 16#c6#, 16#d2#, 16#79#, 16#20#,
16#9a#, 16#db#, 16#c0#, 16#fe#, 16#78#, 16#cd#, 16#5a#, 16#f4#,
16#1f#, 16#dd#, 16#a8#, 16#33#, 16#88#, 16#07#, 16#c7#, 16#31#,
16#b1#, 16#12#, 16#10#, 16#59#, 16#27#, 16#80#, 16#ec#, 16#5f#,
16#60#, 16#51#, 16#7f#, 16#a9#, 16#19#, 16#b5#, 16#4a#, 16#0d#,
16#2d#, 16#e5#, 16#7a#, 16#9f#, 16#93#, 16#c9#, 16#9c#, 16#ef#,
16#a0#, 16#e0#, 16#3b#, 16#4d#, 16#ae#, 16#2a#, 16#f5#, 16#b0#,
16#c8#, 16#eb#, 16#bb#, 16#3c#, 16#83#, 16#53#, 16#99#, 16#61#,
16#17#, 16#2b#, 16#04#, 16#7e#, 16#ba#, 16#77#, 16#d6#, 16#26#,
16#e1#, 16#69#, 16#14#, 16#63#, 16#55#, 16#21#, 16#0c#, 16#7d#);
procedure SubBytes(State : in out State_Type)
with
Depends => (State => State)
is
begin
for I in State_Row_Index_Type loop
for J in State_Column_Index_Type loop
State(I, J) := S_Box(State(I, J));
end loop;
end loop;
end SubBytes;
procedure InvSubBytes(State : in out State_Type)
with
Depends => (State => State)
is
begin
for I in State_Row_Index_Type loop
for J in State_Column_Index_Type loop
State(I, J) := Inverse_S_Box(State(I, J));
end loop;
end loop;
end InvSubBytes;
procedure ShiftRows(State : in out State_Type)
with
Depends => (State => State)
is
procedure Shift_One_Row(Row : in State_Row_Index_Type; Amount : in State_Column_Index_Type)
with
Global => (In_Out => State),
Depends => (State =>+ (Row, Amount))
is
type Temporary_Array_Type is array(State_Column_Index_Type) of ACO.Octet;
Temporary_Array : Temporary_Array_Type := Temporary_Array_Type'(others => 0);
begin
-- Copy items from State to Temporary_Array, wrapping around if necessary.
for J in State_Column_Index_Type loop
Temporary_Array(J - Amount) := State(Row, J);
end loop;
-- Copy shifted row back to State.
for J in State_Column_Index_Type loop
State(Row, J) := Temporary_Array(J);
end loop;
end Shift_One_Row;
begin
Shift_One_Row(1, 1);
Shift_One_Row(2, 2);
Shift_One_Row(3, 3);
end ShiftRows;
procedure InvShiftRows(State : in out State_Type)
with
Depends => (State => State)
is
procedure Shift_One_Row(Row : in State_Row_Index_Type; Amount : in State_Column_Index_Type)
with
Global => (In_Out => State),
Depends => (State =>+ (Row, Amount))
is
type Temporary_Array_Type is array(State_Column_Index_Type) of ACO.Octet;
Temporary_Array : Temporary_Array_Type := Temporary_Array_Type'(others => 0);
begin
-- Copy items from State to Temporary_Array, wrapping around if necessary.
for J in State_Column_Index_Type loop
Temporary_Array(J + Amount) := State(Row, J);
end loop;
-- Copy shifted row back to State.
for J in State_Column_Index_Type loop
State(Row, J) := Temporary_Array(J);
end loop;
end Shift_One_Row;
begin
Shift_One_Row(1, 1);
Shift_One_Row(2, 2);
Shift_One_Row(3, 3);
end InvShiftRows;
procedure AddRoundKey(State : in out State_Type; B : in AES_Algorithm; Round : in Round_Index_Type)
with
Depends => (State =>+ (B, Round))
is
begin
for I in State_Row_Index_Type loop
for J in State_Column_Index_Type loop
State(I, J) := State(I, J) xor B.W(I, Nb*Round + Key_Column_Index_Type(J));
end loop;
end loop;
end AddRoundKey;
procedure To_State(Block : in ACO.Octet_Array; State : out State_Type)
with
Depends => (State => Block),
Pre => Block'Length = 16
is
begin
for J in State_Column_Index_Type loop
for I in State_Row_Index_Type loop
State(I, J) :=
Block(Block'First + (4*Natural(J - State_Column_Index_Type'First) + (I - State_Row_Index_Type'First)));
end loop;
end loop;
end To_State;
procedure From_State(State : in State_Type; Block : out ACO.Octet_Array)
with
Depends => (Block =>+ State),
Pre => Block'Length = 16
is
begin
for J in State_Column_Index_Type loop
for I in State_Row_Index_Type loop
Block(Block'First + (4*Natural(J - State_Column_Index_Type'First) + (I - State_Row_Index_Type'First))) :=
State(I, J);
end loop;
end loop;
end From_State;
----------------------
-- Visible Subprograms
----------------------
procedure Encrypt
(B : in AES_Algorithm;
Block : in out ACO.Octet_Array) is
State : State_Type;
begin
To_State(Block, State);
AddRoundKey(State, B, 0);
for I in Round_Index_Type range 1 .. Nr loop
SubBytes(State);
ShiftRows(State);
if I /= Nr then
-- MixColumns(State);
null;
end if;
AddRoundKey(State, B, I);
end loop;
From_State(State, Block);
end Encrypt;
procedure Decrypt
(B : in AES_Algorithm;
Block : in out ACO.Octet_Array) is
State : State_Type;
begin
To_State(Block, State);
AddRoundKey(State, B, Nr);
for I in reverse Round_Index_Type range 0 .. Nr - 1 loop
InvShiftRows(State);
InvSubBytes(State);
AddRoundKey(State, B, I);
if I /= 0 then
-- InvMixColumns(State);
null;
end if;
end loop;
From_State(State, Block);
end Decrypt;
procedure Initialize
(B : out AES_Algorithm;
Key : in ACO.Octet_Array) is
type Word_Type is array(Key_Row_Index_Type) of ACO.Octet;
Left : Word_Type;
Right : Word_Type;
function G(Word : Word_Type; Round_Index : Round_Index_Type) return Word_Type
with
Pre => Round_Index > 0
is
type Round_Constant_Lookup_Table is array(Round_Index_Type) of ACO.Octet;
Round_Constants : constant Round_Constant_Lookup_Table :=
Round_Constant_Lookup_Table'(0 => 0, 1 => 16#01#, 2 => 16#02#, 3 => 16#04#,
4 => 16#08#, 5 => 16#10#, 6 => 16#20#, 7 => 16#40#,
8 => 16#80#, 9 => 16#1B#,10 => 16#36#);
Result : Word_Type;
begin
Result := Word_Type'(others => 0);
Result(0) := Word(1);
Result(1) := Word(2);
Result(2) := Word(3);
Result(3) := Word(0);
for I in Key_Row_Index_Type loop
Result(I) := S_Box(Result(I));
end loop;
Result(0) := Result(0) xor Round_Constants(Round_Index);
return Result;
end G;
function Get_Column(Column : Key_Column_Index_Type) return Word_Type
with
Global => (Input => B)
is
Result : Word_Type;
begin
Result := Word_Type'(others => 0);
for I in Key_Row_Index_Type loop
Result(I) := B.W(I, Column);
end loop;
return Result;
end Get_Column;
begin -- Initialize
B.W := Expanded_Key_Type'(others => (others => 0));
-- Initialize the first four columns of the expanded key.
for J in Key_Column_Index_Type range 0 .. Nk - 1 loop
for I in Key_Row_Index_Type loop
B.W(I, J) := Key(I + 4*J);
end loop;
end loop;
-- Fill in the other chunks of the expanded key.
for K in Round_Index_Type range 1 .. Nr loop
for J in Key_Column_Index_Type range 4*K .. 4*(K + 1) - 1 loop
Left := Get_Column(J - 4);
Right := Get_Column(J - 1);
if J = 4*K then
Left := G(Left, K);
end if;
for I in Key_Row_Index_Type loop
B.W(I, J) := Left(I) xor Right(I);
end loop;
end loop;
end loop;
end Initialize;
end ACO.Crypto.Algorithms.AES;
|
HeisenbugLtd/cache-sim | Ada | 12,336 | adb | ------------------------------------------------------------------------------
-- Copyright (C) 2012-2020 by Heisenbug Ltd.
--
-- This work is free. You can redistribute it and/or modify it under the
-- terms of the Do What The Fuck You Want To Public License, Version 2,
-- as published by Sam Hocevar. See the LICENSE file for more details.
--------------------------------------------------------------------------------
pragma License (Unrestricted);
with Ada.Text_IO;
with Ada.Numerics.Float_Random;
package body Caches.Simple_Caches is
Debug : constant Boolean := False;
Random : Ada.Numerics.Float_Random.Generator;
-----------------------------------------------------------------------------
-- Connect
-----------------------------------------------------------------------------
procedure Connect (This : in out Simple_Cache;
Next : access Cache'Class;
Speed_Factor : in Long_Float := 8.0) is
begin
This.Next_Level := Cache_Ptr (Next);
This.Config.Speed_Factor := Speed_Factor;
end Connect;
-----------------------------------------------------------------------------
-- Fetch_Line
-----------------------------------------------------------------------------
procedure Fetch_Line (This : in out Simple_Cache;
Block : in Unsigned;
Tag : in Address;
State : in Line_State)
is
Slot : Unsigned;
begin
if Debug then
Ada.Text_IO.Put_Line
("LEVEL" & Positive'Image (This.Level_Id) &
": Fetching block" & Unsigned'Image (Block) &
", tag" & Address'Image (Tag) &
".");
end if;
-- If a line needs to be fetched, we had a cache miss.
This.Events.Misses := This.Events.Misses + 1;
This.Events.Lines_Fetched := This.Events.Lines_Fetched + 1;
-- Find a free slot in the block and fetch the line.
for i in This.State'Range (2) loop
if This.State (Block, i).State = Invalid then
Slot := i;
goto FETCH;
end if;
end loop;
-- No free slot has been found, select a random slot.
-- (TODO: LRU scheme)
Slot :=
Unsigned
(Ada.Numerics.Float_Random.Random (Gen => Random) *
Float (This.Association - 1)) + 1;
if Debug then
Ada.Text_IO.Put_Line
("LEVEL" & Positive'Image (This.Level_Id) &
": Selected slot" & Unsigned'Image (Slot) &
".");
end if;
-- If selected slot contains a dirty cache line, it must be written out
-- first.
if This.State (Block, Slot).State = Dirty then
-- Flush cache line.
This.Events.Lines_Flushed := This.Events.Lines_Flushed + 1;
-- Propagate the flush to the next level if there is one.
if This.Next_Level /= null then
Write (This => This.Next_Level.all,
Where => To_Address (This => Simple_Cache'Class (This),
Tag => This.State (Block, Slot).Tag,
Block => Block));
end if;
end if;
<<FETCH>>
-- Simulate getting the line from the next level if there is one.
if This.Next_Level /= null then
Read (This => This.Next_Level.all,
Where => To_Address (This => Simple_Cache'Class (This),
Tag => Tag,
Block => Block));
end if;
This.State (Block, Slot) := Cache_Line_Info'(State => State,
Tag => Tag);
end Fetch_Line;
-----------------------------------------------------------------------------
-- Flush
-----------------------------------------------------------------------------
procedure Flush (This : in out Simple_Cache;
Recursive : in Boolean := True) is
begin
This.State := (others => (others => Cache_Line_Info'(State => Invalid,
Tag => 0)));
if Recursive and then This.Next_Level /= null then
Flush (This => This.Next_Level.all);
end if;
end Flush;
-----------------------------------------------------------------------------
-- Get_Block
-----------------------------------------------------------------------------
procedure Get_Block (This : in Simple_Cache;
Where : in Address;
Block : out Unsigned;
Tag : out Address)
is
Mem_Block : Address;
begin
-- Check if address is cached already. Scan the appropriate block.
--
-- _ _ _ _ _ _ _ _ _
-- |_|_|_|_|_|_|_|_|_|
-- |___| |_____| |_|
-- | | |
-- | | +------ cache line length
-- | +------------ cache block
-- +------------------- address tag
--
-- Calculation:
-- Address blocks divided by the cache-line length results in the
-- memory block.
Mem_Block := Where / Address (This.Cache_Line);
-- The address tag to be stored
Tag := Mem_Block / Address (This.Num_Blocks);
-- The responsible cache block is the memory block modulo block size.
Block := (Unsigned (Mem_Block) mod This.Num_Blocks) + 1;
if Debug then
Ada.Text_IO.Put
("LEVEL" & Positive'Image (This.Level_Id) &
": Accessing address" & Address'Image (Where) &
" (block" & Unsigned'Image (Block) &
", tag" & Address'Image (Tag) &
")...");
end if;
end Get_Block;
-----------------------------------------------------------------------------
-- Initialize
-----------------------------------------------------------------------------
procedure Initialize (This : in out Simple_Cache) is
begin
This.Config :=
Configuration'
(Cache_Line => This.Cache_Line,
Association => This.Association,
Num_Blocks => This.Num_Blocks,
Cache_Size => This.Cache_Line * This.Association * This.Num_Blocks,
Speed_Factor => 1.0);
Reset (This => Simple_Cache'Class (This));
Flush (This => Simple_Cache'Class (This));
This.Next_Level := null;
end Initialize;
-----------------------------------------------------------------------------
-- Perf_Index
-----------------------------------------------------------------------------
function Perf_Index (This : in Simple_Cache;
Recursive : in Boolean := True) return Long_Float
is
Result : Long_Float;
begin
Result :=
1.0 * Long_Float (This.Events.Hits) +
1.0 * Long_Float (This.Events.Misses) +
Long_Float (This.Cache_Line) * Long_Float (This.Events.Lines_Fetched) +
Long_Float (This.Cache_Line) * Long_Float (This.Events.Lines_Flushed);
-- Simpler calculation, probably "good enough".
-- # hits + # misses * Some_Miss_Factor.
-- Result := ( 1.0 * Long_Float (This.Events.Hits)
-- + 8.0 * Long_Float (This.Events.Misses));
if Recursive and then This.Next_Level /= null then
Result :=
(Result +
This.Config.Speed_Factor * Perf_Index (This.Next_Level.all));
end if;
return Result;
end Perf_Index;
-----------------------------------------------------------------------------
-- Read
-----------------------------------------------------------------------------
procedure Read (This : in out Simple_Cache;
Where : in Address)
is
Tag : Address;
Block : Unsigned;
begin
if Debug then
Ada.Text_IO.Put_Line
("LEVEL" & Positive'Image (This.Level_Id) &
": Read from address" & Address'Image (Where) & ".");
end if;
This.Events.Reads := This.Events.Reads + 1;
-- Get block in cache where to look up for given address.
Get_Block (This => Simple_Cache'Class (This),
Where => Where,
Block => Block,
Tag => Tag);
-- Check if memory is loaded in one of the available slots.
for i in This.State'Range (2) loop
if
This.State (Block, i).State in Full .. Dirty
and then This.State (Block, i).Tag = Tag
then
if Debug then
Ada.Text_IO.Put_Line
("HIT (slot" & Unsigned'Image (i) & ")!");
end if;
This.Events.Hits := This.Events.Hits + 1;
return;
end if;
end loop;
if Debug then
Ada.Text_IO.Put_Line ("MISS!");
end if;
-- Cache miss. Fetch the required cache line.
Fetch_Line (This => Simple_Cache'Class (This),
Block => Block,
Tag => Tag,
State => Full);
end Read;
-----------------------------------------------------------------------------
-- Reset
-----------------------------------------------------------------------------
procedure Reset (This : in out Simple_Cache;
Recursive : in Boolean := True) is
begin
This.Events := Event_Info'(Reads => 0,
Writes => 0,
Lines_Fetched => 0,
Lines_Flushed => 0,
Hits => 0,
Misses => 0);
if Recursive and then This.Next_Level /= null then
Reset (This.Next_Level.all);
end if;
end Reset;
-----------------------------------------------------------------------------
-- To_Address
-----------------------------------------------------------------------------
function To_Address (This : in Simple_Cache;
Tag : in Address;
Block : in Unsigned) return Address is
begin
return
Tag * Address (This.Num_Blocks) * Address (This.Cache_Line) +
Address (Block - 1) * Address (This.Cache_Line);
end To_Address;
-----------------------------------------------------------------------------
-- Write
-----------------------------------------------------------------------------
procedure Write (This : in out Simple_Cache;
Where : in Address)
is
Block : Unsigned;
Tag : Address;
begin
if Debug then
Ada.Text_IO.Put_Line
("LEVEL" & Positive'Image (This.Level_Id) &
": Write to address" & Address'Image (Where) &
".");
end if;
This.Events.Writes := This.Events.Writes + 1;
-- Get block in cache where to look up for given address.
Get_Block (This => Simple_Cache'Class (This),
Where => Where,
Block => Block,
Tag => Tag);
-- Check if memory is loaded in one of the available slots.
for i in This.State'Range (2) loop
if
This.State (Block, i).State in Full .. Dirty
and then This.State (Block, i).Tag = Tag
then
if Debug then
Ada.Text_IO.Put_Line
("HIT (slot" & Unsigned'Image (i) & ")!");
end if;
-- Mark line as dirty, as we've written to it.
This.State (Block, i).State := Dirty;
This.Events.Hits := This.Events.Hits + 1;
return;
end if;
end loop;
if Debug then
Ada.Text_IO.Put_Line ("MISS!");
end if;
-- Cache miss. Whole line needs to be fetched.
Fetch_Line (This => Simple_Cache'Class (This),
Block => Block,
Tag => Tag,
State => Dirty);
end Write;
end Caches.Simple_Caches;
|
LiberatorUSA/GUCEF | Ada | 569 | adb | package body agar.gui.widget.separator is
package cbinds is
procedure set_padding
(separator : separator_access_t;
pixels : c.int);
pragma import (c, set_padding, "AG_SeparatorSetPadding");
end cbinds;
procedure set_padding
(separator : separator_access_t;
pixels : natural) is
begin
cbinds.set_padding (separator, c.int (pixels));
end set_padding;
function widget (separator : separator_access_t) return widget_access_t is
begin
return separator.widget'access;
end widget;
end agar.gui.widget.separator;
|
io7m/coreland-openal-ada | Ada | 2,964 | ads | with OpenAL.Types;
package OpenAL.Listener is
--
-- API
--
--
-- Position
--
-- proc_map : alListener3f
procedure Set_Position_Float
(X : in Types.Float_t;
Y : in Types.Float_t;
Z : in Types.Float_t);
-- proc_map : alListener3i
procedure Set_Position_Discrete
(X : in Types.Integer_t;
Y : in Types.Integer_t;
Z : in Types.Integer_t);
-- proc_map : alListenerfv
procedure Set_Position_Float_List
(Position : in Types.Vector_3f_t);
-- proc_map : alListeneriv
procedure Set_Position_Discrete_List
(Position : in Types.Vector_3i_t);
-- proc_map : alGetListener3f
procedure Get_Position_Float
(X : out Types.Float_t;
Y : out Types.Float_t;
Z : out Types.Float_t);
-- proc_map : alGetListener3i
procedure Get_Position_Discrete
(X : out Types.Integer_t;
Y : out Types.Integer_t;
Z : out Types.Integer_t);
-- proc_map : alGetListenerfv
procedure Get_Position_Float_List
(Position : out Types.Vector_3f_t);
-- proc_map : alGetListeneriv
procedure Get_Position_Discrete_List
(Position : out Types.Vector_3i_t);
--
-- Velocity
--
-- proc_map : alListener3f
procedure Set_Velocity_Float
(X : in Types.Float_t;
Y : in Types.Float_t;
Z : in Types.Float_t);
-- proc_map : alListener3i
procedure Set_Velocity_Discrete
(X : in Types.Integer_t;
Y : in Types.Integer_t;
Z : in Types.Integer_t);
-- proc_map : alListenerfv
procedure Set_Velocity_Float_List (Velocity : in Types.Vector_3f_t);
-- proc_map : alListeneriv
procedure Set_Velocity_Discrete_List (Velocity : in Types.Vector_3i_t);
-- proc_map : alGetListener3f
procedure Get_Velocity_Float
(X : out Types.Float_t;
Y : out Types.Float_t;
Z : out Types.Float_t);
-- proc_map : alGetListener3i
procedure Get_Velocity_Discrete
(X : out Types.Integer_t;
Y : out Types.Integer_t;
Z : out Types.Integer_t);
-- proc_map : alGetListenerfv
procedure Get_Velocity_Float_List (Velocity : out Types.Vector_3f_t);
-- proc_map : alGetListeneriv
procedure Get_Velocity_Discrete_List (Velocity : out Types.Vector_3i_t);
--
-- Gain
--
-- proc_map : alListener
procedure Set_Gain (Gain : in Types.Float_t);
-- proc_map : alGetListener
procedure Get_Gain (Gain : out Types.Float_t);
--
-- Orientation
--
-- proc_map : alListener
procedure Set_Orientation_Float
(Forward : in Types.Vector_3f_t;
Up : in Types.Vector_3f_t);
-- proc_map : alListener
procedure Set_Orientation_Discrete
(Forward : in Types.Vector_3i_t;
Up : in Types.Vector_3i_t);
-- proc_map : alGetListener
procedure Get_Orientation_Float
(Forward : out Types.Vector_3f_t;
Up : out Types.Vector_3f_t);
-- proc_map : alGetListener
procedure Get_Orientation_Discrete
(Forward : out Types.Vector_3i_t;
Up : out Types.Vector_3i_t);
end OpenAL.Listener;
|
charlie5/lace | Ada | 467 | ads | with
chat.Client;
package chat.Registrar
--
-- A singleton providing the central chat registrar.
-- Limited to a maximum of 5_000 chat clients running at once.
--
is
pragma remote_Call_interface;
Name_already_used : exception;
procedure register (the_Client : in Client.view);
procedure deregister (the_Client : in Client.view);
function all_Clients return chat.Client.views;
procedure ping;
procedure shutdown;
end chat.Registrar;
|
reznikmm/matreshka | Ada | 3,754 | ads | ------------------------------------------------------------------------------
-- --
-- Matreshka Project --
-- --
-- Open Document Toolkit --
-- --
-- Runtime Library Component --
-- --
------------------------------------------------------------------------------
-- --
-- Copyright © 2014, Vadim Godunko <[email protected]> --
-- All rights reserved. --
-- --
-- Redistribution and use in source and binary forms, with or without --
-- modification, are permitted provided that the following conditions --
-- are met: --
-- --
-- * Redistributions of source code must retain the above copyright --
-- notice, this list of conditions and the following disclaimer. --
-- --
-- * Redistributions in binary form must reproduce the above copyright --
-- notice, this list of conditions and the following disclaimer in the --
-- documentation and/or other materials provided with the distribution. --
-- --
-- * Neither the name of the Vadim Godunko, IE nor the names of its --
-- contributors may be used to endorse or promote products derived from --
-- this software without specific prior written permission. --
-- --
-- THIS SOFTWARE IS PROVIDED BY THE COPYRIGHT HOLDERS AND CONTRIBUTORS --
-- "AS IS" AND ANY EXPRESS OR IMPLIED WARRANTIES, INCLUDING, BUT NOT --
-- LIMITED TO, THE IMPLIED WARRANTIES OF MERCHANTABILITY AND FITNESS FOR --
-- A PARTICULAR PURPOSE ARE DISCLAIMED. IN NO EVENT SHALL THE COPYRIGHT --
-- HOLDER OR CONTRIBUTORS BE LIABLE FOR ANY DIRECT, INDIRECT, INCIDENTAL, --
-- SPECIAL, EXEMPLARY, OR CONSEQUENTIAL DAMAGES (INCLUDING, BUT NOT LIMITED --
-- TO, PROCUREMENT OF SUBSTITUTE GOODS OR SERVICES; LOSS OF USE, DATA, OR --
-- PROFITS; OR BUSINESS INTERRUPTION) HOWEVER CAUSED AND ON ANY THEORY OF --
-- LIABILITY, WHETHER IN CONTRACT, STRICT LIABILITY, OR TORT (INCLUDING --
-- NEGLIGENCE OR OTHERWISE) ARISING IN ANY WAY OUT OF THE USE OF THIS --
-- SOFTWARE, EVEN IF ADVISED OF THE POSSIBILITY OF SUCH DAMAGE. --
-- --
------------------------------------------------------------------------------
-- $Revision$ $Date$
------------------------------------------------------------------------------
with XML.DOM.Attributes;
package ODF.DOM.Dr3d_Edge_Rounding_Mode_Attributes is
pragma Preelaborate;
type ODF_Dr3d_Edge_Rounding_Mode_Attribute is limited interface
and XML.DOM.Attributes.DOM_Attribute;
type ODF_Dr3d_Edge_Rounding_Mode_Attribute_Access is
access all ODF_Dr3d_Edge_Rounding_Mode_Attribute'Class
with Storage_Size => 0;
end ODF.DOM.Dr3d_Edge_Rounding_Mode_Attributes;
|
Tim-Tom/project-euler | Ada | 58 | ads | package Problem_28 is
procedure Solve;
end Problem_28;
|
stcarrez/ada-ado | Ada | 2,037 | ads | -----------------------------------------------------------------------
-- ado-sqlite -- SQLite Database Drivers
-- Copyright (C) 2019, 2023 Stephane Carrez
-- Written by Stephane Carrez ([email protected])
--
-- Licensed under the Apache License, Version 2.0 (the "License");
-- you may not use this file except in compliance with the License.
-- You may obtain a copy of the License at
--
-- http://www.apache.org/licenses/LICENSE-2.0
--
-- Unless required by applicable law or agreed to in writing, software
-- distributed under the License is distributed on an "AS IS" BASIS,
-- WITHOUT WARRANTIES OR CONDITIONS OF ANY KIND, either express or implied.
-- See the License for the specific language governing permissions and
-- limitations under the License.
-----------------------------------------------------------------------
with Util.Properties;
-- === SQLite Database Driver ===
-- The SQLite database driver can be initialize explicitly by using the `ado_sqlite`
-- GNAT project and calling the initialization procedure.
--
-- ADO.Sqlite.Initialize ("db.properties");
--
-- The set of configuration properties can be set programatically and passed to the
-- `Initialize` operation.
--
-- Config : Util.Properties.Manager;
-- ...
-- Config.Set ("ado.database", "sqlite:///regtests.db?synchronous=OFF&encoding=UTF-8");
-- Config.Set ("ado.queries.path", ".;db");
-- ADO.Sqlite.Initialize (Config);
--
-- The SQLite database driver will pass all the properties as SQLite `pragma` allowing
-- the configuration of the SQLite database.
--
package ADO.Sqlite is
-- Initialize the SQLite driver.
procedure Initialize;
-- Initialize the drivers and the library by reading the property file
-- and configure the runtime with it.
procedure Initialize (Config : in String);
-- Initialize the drivers and the library and configure the runtime with the given properties.
procedure Initialize (Config : in Util.Properties.Manager'Class);
end ADO.Sqlite;
|
pdaxrom/Kino2 | Ada | 3,634 | ads | ------------------------------------------------------------------------------
-- --
-- GNAT ncurses Binding --
-- --
-- Terminal_Interface.Curses.Text_IO.Decimal_IO --
-- --
-- S P E C --
-- --
------------------------------------------------------------------------------
-- Copyright (c) 1998 Free Software Foundation, Inc. --
-- --
-- Permission is hereby granted, free of charge, to any person obtaining a --
-- copy of this software and associated documentation files (the --
-- "Software"), to deal in the Software without restriction, including --
-- without limitation the rights to use, copy, modify, merge, publish, --
-- distribute, distribute with modifications, sublicense, and/or sell --
-- copies of the Software, and to permit persons to whom the Software is --
-- furnished to do so, subject to the following conditions: --
-- --
-- The above copyright notice and this permission notice shall be included --
-- in all copies or substantial portions of the Software. --
-- --
-- THE SOFTWARE IS PROVIDED "AS IS", WITHOUT WARRANTY OF ANY KIND, EXPRESS --
-- OR IMPLIED, INCLUDING BUT NOT LIMITED TO THE WARRANTIES OF --
-- MERCHANTABILITY, FITNESS FOR A PARTICULAR PURPOSE AND NONINFRINGEMENT. --
-- IN NO EVENT SHALL THE ABOVE COPYRIGHT HOLDERS BE LIABLE FOR ANY CLAIM, --
-- DAMAGES OR OTHER LIABILITY, WHETHER IN AN ACTION OF CONTRACT, TORT OR --
-- OTHERWISE, ARISING FROM, OUT OF OR IN CONNECTION WITH THE SOFTWARE OR --
-- THE USE OR OTHER DEALINGS IN THE SOFTWARE. --
-- --
-- Except as contained in this notice, the name(s) of the above copyright --
-- holders shall not be used in advertising or otherwise to promote the --
-- sale, use or other dealings in this Software without prior written --
-- authorization. --
------------------------------------------------------------------------------
-- Author: Juergen Pfeifer, 1996
-- Contact: http://www.familiepfeifer.de/Contact.aspx?Lang=en
-- Version Control:
-- $Revision: 1.10 $
-- Binding Version 01.00
------------------------------------------------------------------------------
generic
type Num is delta <> digits <>;
package Terminal_Interface.Curses.Text_IO.Decimal_IO is
Default_Fore : Field := Num'Fore;
Default_Aft : Field := Num'Aft;
Default_Exp : Field := 0;
procedure Put
(Win : in Window;
Item : in Num;
Fore : in Field := Default_Fore;
Aft : in Field := Default_Aft;
Exp : in Field := Default_Exp);
procedure Put
(Item : in Num;
Fore : in Field := Default_Fore;
Aft : in Field := Default_Aft;
Exp : in Field := Default_Exp);
private
pragma Inline (Put);
end Terminal_Interface.Curses.Text_IO.Decimal_IO;
|
fnarenji/BoiteMaker | Ada | 383 | ads | with ada.strings.unbounded;
use ada.strings.unbounded;
package imagemagick is
imagemagick_failure : exception;
-- transforme l'image passée en chaine base64 et obtient ses dimensions
procedure get_base64(file : string; base64 : out unbounded_string; width, height : out integer);
private
base64_temp_file : constant string := "base64.txt";
end imagemagick;
|
godunko/adawebui | Ada | 3,877 | adb | ------------------------------------------------------------------------------
-- --
-- Matreshka Project --
-- --
-- Web Framework --
-- --
-- Runtime Library Component --
-- --
------------------------------------------------------------------------------
-- --
-- Copyright © 2018-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: 5871 $ $Date: 2018-09-22 11:55:27 +0200 (Sat, 22 Sep 2018) $
------------------------------------------------------------------------------
package body Web.UI.Applications.Internals is
--------------
-- Focus_In --
--------------
procedure Focus_In (Widget : Web.UI.Widgets.Widget_Access) is
begin
Instance.Focus_Changed.Emit (null, Widget);
end Focus_In;
---------------
-- Focus_Out --
---------------
procedure Focus_Out (Widget : Web.UI.Widgets.Widget_Access) is
begin
Instance.Focus_Changed.Emit (Widget, null);
end Focus_Out;
end Web.UI.Applications.Internals;
|
AdaCore/libadalang | Ada | 572 | adb | procedure Test is
generic
type T is private;
function GF (X : T) return Integer;
function GF (X : T) return Integer is
begin
return 1;
end GF;
package PT is
type T is range 1 .. 99;
function F is new GF (T);
end PT;
package Q is
type T is new PT.T;
end Q;
package P is
function G (A : Q.T) return Integer;
end P;
package body P is
function G (A : Q.T) return Integer is
begin
return Q.F (A);
pragma Test_Statement;
end G;
end P;
begin
null;
end Test;
|
MinimSecure/unum-sdk | Ada | 820 | ads | -- Copyright 2012-2016 Free Software Foundation, Inc.
--
-- This program is free software; you can redistribute it and/or modify
-- it under the terms of the GNU General Public License as published by
-- the Free Software Foundation; either version 3 of the License, or
-- (at your option) any later version.
--
-- This program is distributed in the hope that it will be useful,
-- but WITHOUT ANY WARRANTY; without even the implied warranty of
-- MERCHANTABILITY or FITNESS FOR A PARTICULAR PURPOSE. See the
-- GNU General Public License for more details.
--
-- You should have received a copy of the GNU General Public License
-- along with this program. If not, see <http://www.gnu.org/licenses/>.
package Pck is
Global_Variable : Integer := 1;
procedure Increment (I : in out Integer);
end Pck;
|
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.Table_Contains_Error_Attributes;
package Matreshka.ODF_Table.Contains_Error_Attributes is
type Table_Contains_Error_Attribute_Node is
new Matreshka.ODF_Table.Abstract_Table_Attribute_Node
and ODF.DOM.Table_Contains_Error_Attributes.ODF_Table_Contains_Error_Attribute
with null record;
overriding function Create
(Parameters : not null access Matreshka.DOM_Attributes.Attribute_L2_Parameters)
return Table_Contains_Error_Attribute_Node;
overriding function Get_Local_Name
(Self : not null access constant Table_Contains_Error_Attribute_Node)
return League.Strings.Universal_String;
end Matreshka.ODF_Table.Contains_Error_Attributes;
|
zhmu/ananas | Ada | 304 | ads | -- { dg-do compile }
pragma Restrictions (No_Streams);
with Ada.Containers.Ordered_Maps;
package No_Streams is
type Arr is new String (1..8);
package My_Ordered_Map is new Ada.Containers.Ordered_Maps
(Key_Type => Natural, Element_Type => Arr);
end No_Streams;
|
vpodzime/ada-util | Ada | 3,691 | adb | -----------------------------------------------------------------------
-- util-beans-basic-lists -- List bean given access to a vector
-- Copyright (C) 2011, 2013, 2017 Stephane Carrez
-- Written by Stephane Carrez ([email protected])
--
-- Licensed under the Apache License, Version 2.0 (the "License");
-- you may not use this file except in compliance with the License.
-- You may obtain a copy of the License at
--
-- http://www.apache.org/licenses/LICENSE-2.0
--
-- Unless required by applicable law or agreed to in writing, software
-- distributed under the License is distributed on an "AS IS" BASIS,
-- WITHOUT WARRANTIES OR CONDITIONS OF ANY KIND, either express or implied.
-- See the License for the specific language governing permissions and
-- limitations under the License.
-----------------------------------------------------------------------
with Ada.Unchecked_Deallocation;
package body Util.Beans.Basic.Lists is
-- ------------------------------
-- Initialize the list bean.
-- ------------------------------
overriding
procedure Initialize (Object : in out List_Bean) is
Bean : constant Readonly_Bean_Access := Object.Current'Unchecked_Access;
begin
Object.Row := Util.Beans.Objects.To_Object (Bean, Util.Beans.Objects.STATIC);
end Initialize;
-- ------------------------------
-- Get the number of elements in the list.
-- ------------------------------
function Get_Count (From : in List_Bean) return Natural is
begin
return Natural (Vectors.Length (From.List));
end Get_Count;
-- ------------------------------
-- Set the current row index. Valid row indexes start at 1.
-- ------------------------------
procedure Set_Row_Index (From : in out List_Bean;
Index : in Natural) is
begin
From.Current_Index := Index;
From.Current := Vectors.Element (From.List, Index - 1);
end Set_Row_Index;
-- ------------------------------
-- Returns the current row index.
-- ------------------------------
function Get_Row_Index (From : in List_Bean) return Natural is
begin
return From.Current_Index;
end Get_Row_Index;
-- ------------------------------
-- Get the element at the current row index.
-- ------------------------------
function Get_Row (From : in List_Bean) return Util.Beans.Objects.Object is
begin
return From.Row;
end Get_Row;
-- ------------------------------
-- Get the value identified by the name.
-- If the name cannot be found, the method should return the Null object.
-- ------------------------------
function Get_Value (From : in List_Bean;
Name : in String) return Util.Beans.Objects.Object is
begin
if Name = "count" then
return Util.Beans.Objects.To_Object (Integer (From.List.Length));
elsif Name = "rowIndex" then
return Util.Beans.Objects.To_Object (From.Current_Index);
else
return Util.Beans.Objects.Null_Object;
end if;
end Get_Value;
-- ------------------------------
-- Deletes the list bean
-- ------------------------------
procedure Free (List : in out Util.Beans.Basic.Readonly_Bean_Access) is
procedure Free is
new Ada.Unchecked_Deallocation (List_Bean'Class,
List_Bean_Access);
begin
if List.all in List_Bean'Class then
declare
L : List_Bean_Access := List_Bean (List.all)'Unchecked_Access;
begin
Free (L);
List := null;
end;
end if;
end Free;
end Util.Beans.Basic.Lists;
|
faelys/natools | Ada | 2,545 | ads | ------------------------------------------------------------------------------
-- Copyright (c) 2014-2017, Natacha Porté --
-- --
-- Permission to use, copy, modify, and distribute this software for any --
-- purpose with or without fee is hereby granted, provided that the above --
-- copyright notice and this permission notice appear in all copies. --
-- --
-- THE SOFTWARE IS PROVIDED "AS IS" AND THE AUTHOR DISCLAIMS ALL WARRANTIES --
-- WITH REGARD TO THIS SOFTWARE INCLUDING ALL IMPLIED WARRANTIES OF --
-- MERCHANTABILITY AND FITNESS. IN NO EVENT SHALL THE AUTHOR BE LIABLE FOR --
-- ANY SPECIAL, DIRECT, INDIRECT, OR CONSEQUENTIAL DAMAGES OR ANY DAMAGES --
-- WHATSOEVER RESULTING FROM LOSS OF USE, DATA OR PROFITS, WHETHER IN AN --
-- ACTION OF CONTRACT, NEGLIGENCE OR OTHER TORTIOUS ACTION, ARISING OUT OF --
-- OR IN CONNECTION WITH THE USE OR PERFORMANCE OF THIS SOFTWARE. --
------------------------------------------------------------------------------
------------------------------------------------------------------------------
-- Natools.S_Expressions.Parsers.Tests provides a test suite for the --
-- S-expression stream parser. --
------------------------------------------------------------------------------
with Natools.Tests;
package Natools.S_Expressions.Parsers.Tests is
pragma Preelaborate (Tests);
package NT renames Natools.Tests;
procedure All_Tests (Report : in out NT.Reporter'Class);
procedure Atom_Encodings (Report : in out NT.Reporter'Class);
procedure Base64_Subexpression (Report : in out NT.Reporter'Class);
procedure Canonical_Encoding (Report : in out NT.Reporter'Class);
procedure Close_Current_List (Report : in out NT.Reporter'Class);
procedure Lockable_Interface (Report : in out NT.Reporter'Class);
procedure Locked_Next (Report : in out NT.Reporter'Class);
procedure Memory_Parser (Report : in out NT.Reporter'Class);
procedure Nested_Subpexression (Report : in out NT.Reporter'Class);
procedure Number_Prefixes (Report : in out NT.Reporter'Class);
procedure Quoted_Escapes (Report : in out NT.Reporter'Class);
procedure Reset (Report : in out NT.Reporter'Class);
procedure Special_Subexpression (Report : in out NT.Reporter'Class);
end Natools.S_Expressions.Parsers.Tests;
|
mitchelhaan/ncurses | Ada | 5,245 | ads | ------------------------------------------------------------------------------
-- --
-- GNAT ncurses Binding --
-- --
-- Terminal_Interface.Curses.Forms.Field_Types.User --
-- --
-- S P E C --
-- --
------------------------------------------------------------------------------
-- Copyright (c) 1998 Free Software Foundation, Inc. --
-- --
-- Permission is hereby granted, free of charge, to any person obtaining a --
-- copy of this software and associated documentation files (the --
-- "Software"), to deal in the Software without restriction, including --
-- without limitation the rights to use, copy, modify, merge, publish, --
-- distribute, distribute with modifications, sublicense, and/or sell --
-- copies of the Software, and to permit persons to whom the Software is --
-- furnished to do so, subject to the following conditions: --
-- --
-- The above copyright notice and this permission notice shall be included --
-- in all copies or substantial portions of the Software. --
-- --
-- THE SOFTWARE IS PROVIDED "AS IS", WITHOUT WARRANTY OF ANY KIND, EXPRESS --
-- OR IMPLIED, INCLUDING BUT NOT LIMITED TO THE WARRANTIES OF --
-- MERCHANTABILITY, FITNESS FOR A PARTICULAR PURPOSE AND NONINFRINGEMENT. --
-- IN NO EVENT SHALL THE ABOVE COPYRIGHT HOLDERS BE LIABLE FOR ANY CLAIM, --
-- DAMAGES OR OTHER LIABILITY, WHETHER IN AN ACTION OF CONTRACT, TORT OR --
-- OTHERWISE, ARISING FROM, OUT OF OR IN CONNECTION WITH THE SOFTWARE OR --
-- THE USE OR OTHER DEALINGS IN THE SOFTWARE. --
-- --
-- Except as contained in this notice, the name(s) of the above copyright --
-- holders shall not be used in advertising or otherwise to promote the --
-- sale, use or other dealings in this Software without prior written --
-- authorization. --
------------------------------------------------------------------------------
-- Author: Juergen Pfeifer <[email protected]> 1996
-- Version Control:
-- $Revision: 1.4 $
-- Binding Version 00.93
------------------------------------------------------------------------------
with Ada.Unchecked_Deallocation;
with Terminal_Interface.Curses.Aux;
package Terminal_Interface.Curses.Forms.Field_Types.User is
pragma Preelaborate (User);
type User_Defined_Field_Type is abstract new Field_Type with null record;
-- This is the root of the mechanism we use to create field types in
-- Ada95. You should your own type derive from this one and implement
-- the Field_Check and Character_Check functions for your own type.
type User_Defined_Field_Type_Access is access all
User_Defined_Field_Type'Class;
function Field_Check
(Fld : Field;
Typ : User_Defined_Field_Type) return Boolean
is abstract;
-- If True is returned, the field is considered valid, otherwise it is
-- invalid.
function Character_Check
(Ch : Character;
Typ : User_Defined_Field_Type) return Boolean
is abstract;
-- If True is returned, the character is considered as valid for the
-- field, otherwise as invalid.
procedure Set_Field_Type (Fld : in Field;
Typ : in User_Defined_Field_Type);
-- This should work for all types derived from User_Defined_Field_Type.
-- No need to reimplement it for your derived type.
-- +----------------------------------------------------------------------
-- | Private Part.
-- | Used by the Choice child package.
private
use type Interfaces.C.Int;
function C_Generic_Type return C_Field_Type;
function Generic_Field_Check (Fld : Field;
Usr : System.Address) return C_Int;
pragma Convention (C, Generic_Field_Check);
-- This is the generic Field_Check_Function for the low-level fieldtype
-- representing all the User_Defined_Field_Type derivates. It routes
-- the call to the Field_Check implementation for the type.
function Generic_Char_Check (Ch : C_Int;
Usr : System.Address) return C_Int;
pragma Convention (C, Generic_Char_Check);
-- This is the generic Char_Check_Function for the low-level fieldtype
-- representing all the User_Defined_Field_Type derivates. It routes
-- the call to the Character_Check implementation for the type.
end Terminal_Interface.Curses.Forms.Field_Types.User;
|
zhmu/ananas | Ada | 946 | adb | -- { dg-do compile }
-- { dg-skip-if "No Dwarf" { { hppa*-*-hpux* } && { ! lp64 } } }
-- { dg-options "-cargs -O0 -g -dA -fgnat-encodings=minimal -margs" }
--
-- This testcase checks that in the DWARF description of the variant type
-- below, the C discriminant is properly described as unsigned, hence the 0x5a
-- ('Z') and 0x80 (128) values in the DW_AT_discr_list attribute. If it was
-- described as signed, we would have instead 90 and -128.
with Ada.Text_IO;
procedure Debug11 is
type Rec_Type (C : Character) is record
case C is
when 'Z' .. Character'Val (128) => I : Integer;
when others => null;
end case;
end record;
-- R : Rec_Type := ('Z', 2);
R : Rec_Type ('Z');
begin
R.I := 0;
Ada.Text_IO.Put_Line ("" & R.C);
end Debug11;
-- { dg-final { scan-assembler-times "0x5a.*DW_AT_discr_list" 1 } }
-- { dg-final { scan-assembler-times "0x80.*DW_AT_discr_list" 1 } }
|
Vovanium/Encodings | Ada | 109 | ads | package Encodings.Unicode.UTF_32 is
subtype UTF_32_String is Wide_Wide_String;
end Encodings.Unicode.UTF_32; |
reznikmm/matreshka | Ada | 3,621 | 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_Constraints.Hash is
new AMF.Elements.Generic_Hash (UML_Time_Constraint, UML_Time_Constraint_Access);
|
flyx/OpenGLAda | Ada | 3,114 | adb | -- part of OpenGLAda, (c) 2017 Felix Krause
-- released under the terms of the MIT license, see the file "COPYING"
with GL.API;
package body GL.Fixed.Matrix is
procedure Apply_Frustum (Stack : Matrix_Stack;
Left, Right, Bottom, Top, Near, Far : Double) is
begin
API.Matrix_Mode (Stack.Mode);
API.Frustum (Left, Right, Bottom, Top, Near, Far);
Raise_Exception_On_OpenGL_Error;
end Apply_Frustum;
procedure Apply_Orthogonal (Stack : Matrix_Stack;
Left, Right, Bottom, Top, Near, Far : Double) is
begin
API.Matrix_Mode (Stack.Mode);
API.Ortho (Left, Right, Bottom, Top, Near, Far);
Raise_Exception_On_OpenGL_Error;
end Apply_Orthogonal;
procedure Load_Identity (Stack : Matrix_Stack) is
begin
API.Matrix_Mode (Stack.Mode);
API.Load_Identity;
Raise_Exception_On_OpenGL_Error;
end Load_Identity;
procedure Load_Matrix (Stack : Matrix_Stack; Value : Matrix4) is
begin
API.Matrix_Mode (Stack.Mode);
API.Load_Matrix (Value);
Raise_Exception_On_OpenGL_Error;
end Load_Matrix;
procedure Apply_Multiplication (Stack : Matrix_Stack; Factor : Matrix4) is
begin
API.Matrix_Mode (Stack.Mode);
API.Mult_Matrix (Factor);
Raise_Exception_On_OpenGL_Error;
end Apply_Multiplication;
procedure Apply_Multiplication (Stack : Matrix_Stack; Factor : Double) is
begin
API.Matrix_Mode (Stack.Mode);
API.Mult_Matrix (Identity4 * Factor);
Raise_Exception_On_OpenGL_Error;
end Apply_Multiplication;
procedure Push (Stack : Matrix_Stack) is
begin
API.Matrix_Mode (Stack.Mode);
API.Push_Matrix;
Raise_Exception_On_OpenGL_Error;
end Push;
procedure Pop (Stack : Matrix_Stack) is
begin
API.Matrix_Mode (Stack.Mode);
API.Pop_Matrix;
Raise_Exception_On_OpenGL_Error;
end Pop;
procedure Apply_Rotation (Stack : Matrix_Stack; Angle : Double;
Axis : Vector3) is
begin
API.Matrix_Mode (Stack.Mode);
API.Rotate (Angle, Axis (X), Axis (Y), Axis (Z));
Raise_Exception_On_OpenGL_Error;
end Apply_Rotation;
procedure Apply_Rotation (Stack : Matrix_Stack; Angle, X, Y, Z : Double) is
begin
API.Matrix_Mode (Stack.Mode);
API.Rotate (Angle, X, Y, Z);
Raise_Exception_On_OpenGL_Error;
end Apply_Rotation;
procedure Apply_Scaling (Stack : Matrix_Stack; X, Y, Z : Double) is
begin
API.Matrix_Mode (Stack.Mode);
API.Scale (X, Y, Z);
Raise_Exception_On_OpenGL_Error;
end Apply_Scaling;
procedure Apply_Translation (Stack : Matrix_Stack; Along : Vector3) is
begin
API.Matrix_Mode (Stack.Mode);
API.Translate (Along (X), Along (Y), Along (Z));
Raise_Exception_On_OpenGL_Error;
end Apply_Translation;
procedure Apply_Translation (Stack : Matrix_Stack; X, Y, Z : Double) is
begin
API.Matrix_Mode (Stack.Mode);
API.Translate (X, Y, Z);
Raise_Exception_On_OpenGL_Error;
end Apply_Translation;
end GL.Fixed.Matrix;
|
reznikmm/matreshka | Ada | 4,852 | adb | ------------------------------------------------------------------------------
-- --
-- Matreshka Project --
-- --
-- Ada Modeling Framework --
-- --
-- Runtime Library Component --
-- --
------------------------------------------------------------------------------
-- --
-- Copyright © 2012, Vadim Godunko <[email protected]> --
-- All rights reserved. --
-- --
-- Redistribution and use in source and binary forms, with or without --
-- modification, are permitted provided that the following conditions --
-- are met: --
-- --
-- * Redistributions of source code must retain the above copyright --
-- notice, this list of conditions and the following disclaimer. --
-- --
-- * Redistributions in binary form must reproduce the above copyright --
-- notice, this list of conditions and the following disclaimer in the --
-- documentation and/or other materials provided with the distribution. --
-- --
-- * Neither the name of the Vadim Godunko, IE nor the names of its --
-- contributors may be used to endorse or promote products derived from --
-- this software without specific prior written permission. --
-- --
-- THIS SOFTWARE IS PROVIDED BY THE COPYRIGHT HOLDERS AND CONTRIBUTORS --
-- "AS IS" AND ANY EXPRESS OR IMPLIED WARRANTIES, INCLUDING, BUT NOT --
-- LIMITED TO, THE IMPLIED WARRANTIES OF MERCHANTABILITY AND FITNESS FOR --
-- A PARTICULAR PURPOSE ARE DISCLAIMED. IN NO EVENT SHALL THE COPYRIGHT --
-- HOLDER OR CONTRIBUTORS BE LIABLE FOR ANY DIRECT, INDIRECT, INCIDENTAL, --
-- SPECIAL, EXEMPLARY, OR CONSEQUENTIAL DAMAGES (INCLUDING, BUT NOT LIMITED --
-- TO, PROCUREMENT OF SUBSTITUTE GOODS OR SERVICES; LOSS OF USE, DATA, OR --
-- PROFITS; OR BUSINESS INTERRUPTION) HOWEVER CAUSED AND ON ANY THEORY OF --
-- LIABILITY, WHETHER IN CONTRACT, STRICT LIABILITY, OR TORT (INCLUDING --
-- NEGLIGENCE OR OTHERWISE) ARISING IN ANY WAY OUT OF THE USE OF THIS --
-- SOFTWARE, EVEN IF ADVISED OF THE POSSIBILITY OF SUCH DAMAGE. --
-- --
------------------------------------------------------------------------------
-- $Revision$ $Date$
------------------------------------------------------------------------------
with AMF.Internals.Objects;
package body AMF.Objects is
------------
-- Equals --
------------
function Equals
(Object : League.Holders.Holder;
Other : League.Holders.Holder) return Boolean is
begin
raise Program_Error;
return False;
end Equals;
---------
-- Get --
---------
function Get
(Object : League.Holders.Holder;
Property : not null AMF.CMOF.Properties.CMOF_Property_Access)
return League.Holders.Holder is
begin
return
AMF.Internals.Objects.Registry.Element
(League.Holders.Get_Tag (Object)).Get (Object, Property);
end Get;
------------
-- Is_Set --
------------
function Is_Set
(Object : League.Holders.Holder;
Property : not null AMF.CMOF.Properties.CMOF_Property_Access)
return Boolean is
begin
raise Program_Error;
return False;
end Is_Set;
---------
-- Set --
---------
procedure Set
(Object : in out League.Holders.Holder;
Property : not null AMF.CMOF.Properties.CMOF_Property_Access;
Value : League.Holders.Holder) is
begin
AMF.Internals.Objects.Registry.Element
(League.Holders.Get_Tag (Object)).Set (Object, Property, Value);
end Set;
-----------
-- Unset --
-----------
procedure Unset
(Object : in out League.Holders.Holder;
Property : not null AMF.CMOF.Properties.CMOF_Property_Access) is
begin
raise Program_Error;
end Unset;
end AMF.Objects;
|
zhmu/ananas | Ada | 1,320 | adb | -- { dg-do run }
with Init5; use Init5;
with Text_IO; use Text_IO;
with Dump;
procedure R5 is
function Get_Elem (R : R1) return Integer is
Tmp : R1 := R;
begin
return Tmp.A(1);
end;
procedure Set_Elem (R : access R1; I : Integer) is
Tmp : R1 := R.all;
begin
Tmp.A(1) := I;
R.all := Tmp;
end;
function Get_Elem (R : R2) return Integer is
Tmp : R2 := R;
begin
return Tmp.A(1);
end;
procedure Set_Elem (R : access R2; I : Integer) is
Tmp : R2 := R.all;
begin
Tmp.A(1) := I;
R.all := Tmp;
end;
A1 : aliased R1 := My_R1;
A2 : aliased R2 := My_R2;
begin
Put ("A1 :");
Dump (A1'Address, R1'Max_Size_In_Storage_Elements);
New_Line;
-- { dg-output "A1 : 78 56 34 12 12 00 ab 00 34 00 cd 00 56 00 ef 00.*\n" }
Put ("A2 :");
Dump (A2'Address, R1'Max_Size_In_Storage_Elements);
New_Line;
-- { dg-output "A2 : 12 34 56 78 00 ab 00 12 00 cd 00 34 00 ef 00 56.*\n" }
if Get_Elem (A1) /= 16#AB0012# then
raise Program_Error;
end if;
Set_Elem (A1'Access, 16#CD0034#);
if Get_Elem (A1) /= 16#CD0034# then
raise Program_Error;
end if;
if Get_Elem (A2) /= 16#AB0012# then
raise Program_Error;
end if;
Set_Elem (A2'Access, 16#CD0034#);
if Get_Elem (A2) /= 16#CD0034# then
raise Program_Error;
end if;
end;
|
persan/A-gst | Ada | 18,765 | ads | pragma Ada_2005;
pragma Style_Checks (Off);
pragma Warnings (Off);
with Interfaces.C; use Interfaces.C;
with glib;
with glib.Values;
with System;
limited with GStreamer.GST_Low_Level.gstreamer_0_10_gst_gstbuffer_h;
with GStreamer.GST_Low_Level.gstreamer_0_10_gst_gstelement_h;
with GStreamer.GST_Low_Level.gstreamer_0_10_gst_gstpad_h;
with GStreamer.GST_Low_Level.gstreamer_0_10_gst_gstsegment_h;
with System;
limited with GStreamer.GST_Low_Level.gstreamer_0_10_gst_gstcaps_h;
with GStreamer.GST_Low_Level.gstreamer_0_10_gst_gstformat_h;
with GLIB; -- with GStreamer.GST_Low_Level.glibconfig_h;
limited with GStreamer.GST_Low_Level.gstreamer_0_10_gst_gstevent_h;
with glib;
with GStreamer.GST_Low_Level.gstreamer_0_10_gst_gstclock_h;
package GStreamer.GST_Low_Level.gstreamer_0_10_gst_base_gstbaseparse_h is
-- unsupported macro: GST_TYPE_BASE_PARSE (gst_base_parse_get_type())
-- arg-macro: function GST_BASE_PARSE (obj)
-- return G_TYPE_CHECK_INSTANCE_CAST((obj),GST_TYPE_BASE_PARSE,GstBaseParse);
-- arg-macro: function GST_BASE_PARSE_CLASS (klass)
-- return G_TYPE_CHECK_CLASS_CAST((klass),GST_TYPE_BASE_PARSE,GstBaseParseClass);
-- arg-macro: function GST_BASE_PARSE_GET_CLASS (obj)
-- return G_TYPE_INSTANCE_GET_CLASS((obj),GST_TYPE_BASE_PARSE,GstBaseParseClass);
-- arg-macro: function GST_IS_BASE_PARSE (obj)
-- return G_TYPE_CHECK_INSTANCE_TYPE((obj),GST_TYPE_BASE_PARSE);
-- arg-macro: function GST_IS_BASE_PARSE_CLASS (klass)
-- return G_TYPE_CHECK_CLASS_TYPE((klass),GST_TYPE_BASE_PARSE);
-- arg-macro: function GST_BASE_PARSE_CAST (obj)
-- return (GstBaseParse *)(obj);
-- arg-macro: function GST_BASE_PARSE_SRC_PAD (obj)
-- return GST_BASE_PARSE_CAST (obj).srcpad;
-- arg-macro: function GST_BASE_PARSE_SINK_PAD (obj)
-- return GST_BASE_PARSE_CAST (obj).sinkpad;
-- unsupported macro: GST_BASE_PARSE_FLOW_DROPPED GST_FLOW_CUSTOM_SUCCESS
-- unsupported macro: GST_BASE_PARSE_FLOW_QUEUED GST_FLOW_CUSTOM_SUCCESS_1
GST_BASE_PARSE_FLAG_LOST_SYNC : constant := (2 ** 0); -- gst/base/gstbaseparse.h:79
GST_BASE_PARSE_FLAG_DRAINING : constant := (2 ** 1); -- gst/base/gstbaseparse.h:80
-- arg-macro: function GST_BASE_PARSE_LOST_SYNC (parse)
-- return notnot(GST_BASE_PARSE_CAST(parse).flags and GST_BASE_PARSE_FLAG_LOST_SYNC);
-- arg-macro: function GST_BASE_PARSE_DRAINING (parse)
-- return notnot(GST_BASE_PARSE_CAST(parse).flags and GST_BASE_PARSE_FLAG_DRAINING);
-- GStreamer
-- * Copyright (C) 2008 Nokia Corporation. All rights reserved.
-- *
-- * Contact: Stefan Kost <[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.
--
--*
-- * GST_BASE_PARSE_SRC_PAD:
-- * @obj: base parse instance
-- *
-- * Gives the pointer to the source #GstPad object of the element.
-- *
-- * Since: 0.10.33
--
--*
-- * GST_BASE_PARSE_SINK_PAD:
-- * @obj: base parse instance
-- *
-- * Gives the pointer to the sink #GstPad object of the element.
-- *
-- * Since: 0.10.33
--
--*
-- * GST_BASE_PARSE_FLOW_DROPPED:
-- *
-- * A #GstFlowReturn that can be returned from parse_frame to
-- * indicate that no output buffer was generated, or from pre_push_frame to
-- * to forego pushing buffer.
-- *
-- * Since: 0.10.33
--
--*
-- * GST_BASE_PARSE_FLOW_QUEUED:
-- *
-- * A #GstFlowReturn that can be returned from parse frame to indicate that
-- * the buffer will be queued to be pushed when the next OK
-- *
-- * Since: 0.10.33
--
-- not public API, use accessor macros below
--*
-- * GST_BASE_PARSE_LOST_SYNC:
-- * @parse: base parse instance
-- *
-- * Obtains current sync status.
-- *
-- * Since: 0.10.33
--
--*
-- * GST_BASE_PARSE_DRAINING:
-- * @parse: base parse instance
-- *
-- * Obtains current drain status (ie. whether EOS has been received and
-- * the parser is now processing the frames at the end of the stream)
-- *
-- * Since: 0.10.33
--
--*
-- * GstBaseParseFrameFlags:
-- * @GST_BASE_PARSE_FRAME_FLAG_NONE: no flag
-- * @GST_BASE_PARSE_FRAME_FLAG_NO_FRAME: set to indicate this buffer should not be
-- * counted as frame, e.g. if this frame is dependent on a previous one.
-- * As it is not counted as a frame, bitrate increases but frame to time
-- * conversions are maintained.
-- * @GST_BASE_PARSE_FRAME_FLAG_CLIP: @pre_push_frame can set this to indicate
-- * that regular segment clipping can still be performed (as opposed to
-- * any custom one having been done).
-- *
-- * Flags to be used in a #GstBaseParseFrame.
-- *
-- * Since: 0.10.33
--
type GstBaseParseFrameFlags is
(GST_BASE_PARSE_FRAME_FLAG_NONE,
GST_BASE_PARSE_FRAME_FLAG_NO_FRAME,
GST_BASE_PARSE_FRAME_FLAG_CLIP);
pragma Convention (C, GstBaseParseFrameFlags); -- gst/base/gstbaseparse.h:122
--*
-- * GstBaseParseFrame:
-- * @buffer: data to check for valid frame or parsed frame.
-- * Subclass is allowed to replace this buffer.
-- * @overhead: subclass can set this to indicates the metadata overhead
-- * for the given frame, which is then used to enable more accurate bitrate
-- * computations. If this is -1, it is assumed that this frame should be
-- * skipped in bitrate calculation.
-- * @flags: a combination of input and output #GstBaseParseFrameFlags that
-- * convey additional context to subclass or allow subclass to tune
-- * subsequent #GstBaseParse actions.
-- *
-- * Frame (context) data passed to each frame parsing virtual methods. In
-- * addition to providing the data to be checked for a valid frame or an already
-- * identified frame, it conveys additional metadata or control information
-- * from and to the subclass w.r.t. the particular frame in question (rather
-- * than global parameters). Some of these may apply to each parsing stage, others
-- * only to some a particular one. These parameters are effectively zeroed at start
-- * of each frame's processing, i.e. parsing virtual method invocation sequence.
-- *
-- * Since: 0.10.33
--
type GstBaseParseFrame_u_gst_reserved_i_array is array (0 .. 1) of aliased GLIB.guint;
type GstBaseParseFrame_u_gst_reserved_p_array is array (0 .. 1) of System.Address;
type GstBaseParseFrame is record
buffer : access GStreamer.GST_Low_Level.gstreamer_0_10_gst_gstbuffer_h.GstBuffer; -- gst/base/gstbaseparse.h:147
flags : aliased GLIB.guint; -- gst/base/gstbaseparse.h:148
overhead : aliased GLIB.gint; -- gst/base/gstbaseparse.h:149
u_gst_reserved_i : aliased GstBaseParseFrame_u_gst_reserved_i_array; -- gst/base/gstbaseparse.h:151
u_gst_reserved_p : GstBaseParseFrame_u_gst_reserved_p_array; -- gst/base/gstbaseparse.h:152
u_private_flags : aliased GLIB.guint; -- gst/base/gstbaseparse.h:153
end record;
pragma Convention (C_Pass_By_Copy, GstBaseParseFrame); -- gst/base/gstbaseparse.h:154
-- skipped anonymous struct anon_316
--< private >
type GstBaseParse;
type u_GstBaseParse_u_gst_reserved_array is array (0 .. 19) of System.Address;
--subtype GstBaseParse is u_GstBaseParse; -- gst/base/gstbaseparse.h:156
type GstBaseParseClass;
type u_GstBaseParseClass_u_gst_reserved_array is array (0 .. 17) of System.Address;
--subtype GstBaseParseClass is u_GstBaseParseClass; -- gst/base/gstbaseparse.h:157
-- skipped empty struct u_GstBaseParsePrivate
-- skipped empty struct GstBaseParsePrivate
--*
-- * GstBaseParse:
-- * @element: the parent element.
-- *
-- * The opaque #GstBaseParse data structure.
--
type GstBaseParse is record
element : aliased GStreamer.GST_Low_Level.gstreamer_0_10_gst_gstelement_h.GstElement; -- gst/base/gstbaseparse.h:167
sinkpad : access GStreamer.GST_Low_Level.gstreamer_0_10_gst_gstpad_h.GstPad; -- gst/base/gstbaseparse.h:171
srcpad : access GStreamer.GST_Low_Level.gstreamer_0_10_gst_gstpad_h.GstPad; -- gst/base/gstbaseparse.h:172
flags : aliased GLIB.guint; -- gst/base/gstbaseparse.h:174
segment : aliased GStreamer.GST_Low_Level.gstreamer_0_10_gst_gstsegment_h.GstSegment; -- gst/base/gstbaseparse.h:177
u_gst_reserved : u_GstBaseParse_u_gst_reserved_array; -- gst/base/gstbaseparse.h:180
priv : System.Address; -- gst/base/gstbaseparse.h:181
end record;
pragma Convention (C_Pass_By_Copy, GstBaseParse); -- gst/base/gstbaseparse.h:166
--< protected >
-- source and sink pads
-- MT-protected (with STREAM_LOCK)
--< private >
--*
-- * GstBaseParseClass:
-- * @parent_class: the parent class
-- * @start: Optional.
-- * Called when the element starts processing.
-- * Allows opening external resources.
-- * @stop: Optional.
-- * Called when the element stops processing.
-- * Allows closing external resources.
-- * @set_sink_caps: allows the subclass to be notified of the actual caps set.
-- * @get_sink_caps: allows the subclass to do its own sink get caps if needed.
-- * Since: 0.10.36
-- * @check_valid_frame: Check if the given piece of data contains a valid
-- * frame.
-- * @parse_frame: Parse the already checked frame. Subclass need to
-- * set the buffer timestamp, duration, caps and possibly
-- * other necessary metadata. This is called with srcpad's
-- * STREAM_LOCK held.
-- * @convert: Optional.
-- * Convert between formats.
-- * @event: Optional.
-- * Event handler on the sink pad. This function should return
-- * TRUE if the event was handled and can be dropped.
-- * @src_event: Optional.
-- * Event handler on the source pad. Should return TRUE
-- * if the event was handled and can be dropped.
-- * @pre_push_frame: Optional.
-- * Called just prior to pushing a frame (after any pending
-- * events have been sent) to give subclass a chance to perform
-- * additional actions at this time (e.g. tag sending) or to
-- * decide whether this buffer should be dropped or not
-- * (e.g. custom segment clipping).
-- * @detect: Optional.
-- * Called until it doesn't return GST_FLOW_OK anymore for
-- * the first buffers. Can be used by the subclass to detect
-- * the stream format. Since: 0.10.36
-- *
-- * Subclasses can override any of the available virtual methods or not, as
-- * needed. At minimum @check_valid_frame and @parse_frame needs to be
-- * overridden.
--
type GstBaseParseClass is record
parent_class : aliased GStreamer.GST_Low_Level.gstreamer_0_10_gst_gstelement_h.GstElementClass; -- gst/base/gstbaseparse.h:226
start : access function (arg1 : access GstBaseParse) return GLIB.gboolean; -- gst/base/gstbaseparse.h:231
stop : access function (arg1 : access GstBaseParse) return GLIB.gboolean; -- gst/base/gstbaseparse.h:233
set_sink_caps : access function (arg1 : access GstBaseParse; arg2 : access GStreamer.GST_Low_Level.gstreamer_0_10_gst_gstcaps_h.GstCaps) return GLIB.gboolean; -- gst/base/gstbaseparse.h:236
check_valid_frame : access function
(arg1 : access GstBaseParse;
arg2 : access GstBaseParseFrame;
arg3 : access GLIB.guint;
arg4 : access GLIB.gint) return GLIB.gboolean; -- gst/base/gstbaseparse.h:241
parse_frame : access function (arg1 : access GstBaseParse; arg2 : access GstBaseParseFrame) return GStreamer.GST_Low_Level.gstreamer_0_10_gst_gstpad_h.GstFlowReturn; -- gst/base/gstbaseparse.h:244
pre_push_frame : access function (arg1 : access GstBaseParse; arg2 : access GstBaseParseFrame) return GStreamer.GST_Low_Level.gstreamer_0_10_gst_gstpad_h.GstFlowReturn; -- gst/base/gstbaseparse.h:247
convert : access function
(arg1 : access GstBaseParse;
arg2 : GStreamer.GST_Low_Level.gstreamer_0_10_gst_gstformat_h.GstFormat;
arg3 : GLIB.gint64;
arg4 : GStreamer.GST_Low_Level.gstreamer_0_10_gst_gstformat_h.GstFormat;
arg5 : access GLIB.gint64) return GLIB.gboolean; -- gst/base/gstbaseparse.h:253
event : access function (arg1 : access GstBaseParse; arg2 : access GStreamer.GST_Low_Level.gstreamer_0_10_gst_gstevent_h.GstEvent) return GLIB.gboolean; -- gst/base/gstbaseparse.h:256
src_event : access function (arg1 : access GstBaseParse; arg2 : access GStreamer.GST_Low_Level.gstreamer_0_10_gst_gstevent_h.GstEvent) return GLIB.gboolean; -- gst/base/gstbaseparse.h:259
get_sink_caps : access function (arg1 : access GstBaseParse) return access GStreamer.GST_Low_Level.gstreamer_0_10_gst_gstcaps_h.GstCaps; -- gst/base/gstbaseparse.h:261
detect : access function (arg1 : access GstBaseParse; arg2 : access GStreamer.GST_Low_Level.gstreamer_0_10_gst_gstbuffer_h.GstBuffer) return GStreamer.GST_Low_Level.gstreamer_0_10_gst_gstpad_h.GstFlowReturn; -- gst/base/gstbaseparse.h:264
u_gst_reserved : u_GstBaseParseClass_u_gst_reserved_array; -- gst/base/gstbaseparse.h:267
end record;
pragma Convention (C_Pass_By_Copy, GstBaseParseClass); -- gst/base/gstbaseparse.h:225
--< public >
-- virtual methods for subclasses
--< private >
function gst_base_parse_get_type return GLIB.GType; -- gst/base/gstbaseparse.h:270
pragma Import (C, gst_base_parse_get_type, "gst_base_parse_get_type");
function gst_base_parse_frame_get_type return GLIB.GType; -- gst/base/gstbaseparse.h:272
pragma Import (C, gst_base_parse_frame_get_type, "gst_base_parse_frame_get_type");
function gst_base_parse_frame_new
(buffer : access GStreamer.GST_Low_Level.gstreamer_0_10_gst_gstbuffer_h.GstBuffer;
flags : GstBaseParseFrameFlags;
overhead : GLIB.gint) return access GstBaseParseFrame; -- gst/base/gstbaseparse.h:274
pragma Import (C, gst_base_parse_frame_new, "gst_base_parse_frame_new");
procedure gst_base_parse_frame_init (frame : access GstBaseParseFrame); -- gst/base/gstbaseparse.h:278
pragma Import (C, gst_base_parse_frame_init, "gst_base_parse_frame_init");
procedure gst_base_parse_frame_free (frame : access GstBaseParseFrame); -- gst/base/gstbaseparse.h:280
pragma Import (C, gst_base_parse_frame_free, "gst_base_parse_frame_free");
function gst_base_parse_push_frame (parse : access GstBaseParse; frame : access GstBaseParseFrame) return GStreamer.GST_Low_Level.gstreamer_0_10_gst_gstpad_h.GstFlowReturn; -- gst/base/gstbaseparse.h:282
pragma Import (C, gst_base_parse_push_frame, "gst_base_parse_push_frame");
procedure gst_base_parse_set_duration
(parse : access GstBaseParse;
fmt : GStreamer.GST_Low_Level.gstreamer_0_10_gst_gstformat_h.GstFormat;
duration : GLIB.gint64;
interval : GLIB.gint); -- gst/base/gstbaseparse.h:285
pragma Import (C, gst_base_parse_set_duration, "gst_base_parse_set_duration");
procedure gst_base_parse_set_average_bitrate (parse : access GstBaseParse; bitrate : GLIB.guint); -- gst/base/gstbaseparse.h:290
pragma Import (C, gst_base_parse_set_average_bitrate, "gst_base_parse_set_average_bitrate");
procedure gst_base_parse_set_min_frame_size (parse : access GstBaseParse; min_size : GLIB.guint); -- gst/base/gstbaseparse.h:293
pragma Import (C, gst_base_parse_set_min_frame_size, "gst_base_parse_set_min_frame_size");
procedure gst_base_parse_set_has_timing_info (parse : access GstBaseParse; has_timing : GLIB.gboolean); -- gst/base/gstbaseparse.h:296
pragma Import (C, gst_base_parse_set_has_timing_info, "gst_base_parse_set_has_timing_info");
procedure gst_base_parse_set_syncable (parse : access GstBaseParse; syncable : GLIB.gboolean); -- gst/base/gstbaseparse.h:299
pragma Import (C, gst_base_parse_set_syncable, "gst_base_parse_set_syncable");
procedure gst_base_parse_set_passthrough (parse : access GstBaseParse; passthrough : GLIB.gboolean); -- gst/base/gstbaseparse.h:302
pragma Import (C, gst_base_parse_set_passthrough, "gst_base_parse_set_passthrough");
procedure gst_base_parse_set_frame_rate
(parse : access GstBaseParse;
fps_num : GLIB.guint;
fps_den : GLIB.guint;
lead_in : GLIB.guint;
lead_out : GLIB.guint); -- gst/base/gstbaseparse.h:305
pragma Import (C, gst_base_parse_set_frame_rate, "gst_base_parse_set_frame_rate");
procedure gst_base_parse_set_latency
(parse : access GstBaseParse;
min_latency : GStreamer.GST_Low_Level.gstreamer_0_10_gst_gstclock_h.GstClockTime;
max_latency : GStreamer.GST_Low_Level.gstreamer_0_10_gst_gstclock_h.GstClockTime); -- gst/base/gstbaseparse.h:311
pragma Import (C, gst_base_parse_set_latency, "gst_base_parse_set_latency");
function gst_base_parse_convert_default
(parse : access GstBaseParse;
src_format : GStreamer.GST_Low_Level.gstreamer_0_10_gst_gstformat_h.GstFormat;
src_value : GLIB.gint64;
dest_format : GStreamer.GST_Low_Level.gstreamer_0_10_gst_gstformat_h.GstFormat;
dest_value : access GLIB.gint64) return GLIB.gboolean; -- gst/base/gstbaseparse.h:315
pragma Import (C, gst_base_parse_convert_default, "gst_base_parse_convert_default");
function gst_base_parse_add_index_entry
(parse : access GstBaseParse;
offset : GLIB.guint64;
ts : GStreamer.GST_Low_Level.gstreamer_0_10_gst_gstclock_h.GstClockTime;
key : GLIB.gboolean;
force : GLIB.gboolean) return GLIB.gboolean; -- gst/base/gstbaseparse.h:321
pragma Import (C, gst_base_parse_add_index_entry, "gst_base_parse_add_index_entry");
end GStreamer.GST_Low_Level.gstreamer_0_10_gst_base_gstbaseparse_h;
|
persan/testlibadalang | Ada | 3,938 | ads | with Utils.Command_Lines; use Utils.Command_Lines;
with Utils.Command_Lines.Common; use Utils.Command_Lines.Common;
package JSON_Gen.Command_Lines is
package Freeze_Common is new Freeze_Descriptor (Common_Descriptor);
Descriptor : aliased Command_Line_Descriptor :=
Copy_Descriptor (Common_Descriptor);
pragma Warnings (Off);
use Common_Flag_Switches, Common_String_Switches,
Common_String_Seq_Switches, Common_Nat_Switches;
pragma Warnings (On);
package Json_Gen_Disable is new Disable_Switches
(Descriptor, (To_All (Rep_Clauses), To_All (Compute_Timing)));
type Json_Gen_Flags is
(Subunits,
Force,
Alphabetical_Order,
Comment_Header_Sample,
Comment_Header_Spec,
Ignored_Keep_Tree_File,
No_Exception,
No_Local_Header,
Ignored_Reuse_Tree_File,
Ignored_Overwrite_Tree_File);
-- Above "Ignored_" switches are legacy switches from the ASIS-based
-- version.
package Json_Gen_Flag_Switches is new Flag_Switches
(Descriptor,
Json_Gen_Flags);
package Json_Gen_Flag_Shorthands is new Json_Gen_Flag_Switches.Set_Shorthands
((Subunits => null,
Force => +"-f",
Alphabetical_Order => +"-gnatyo",
Comment_Header_Sample => +"-hg",
Comment_Header_Spec => +"-hs",
Ignored_Keep_Tree_File => +"-k",
No_Exception => null,
No_Local_Header => null,
Ignored_Reuse_Tree_File => +"-r",
Ignored_Overwrite_Tree_File => +"-t"));
type Json_Gen_Strings is
(Header_File,
Output);
package Json_Gen_String_Switches is new String_Switches
(Descriptor,
Json_Gen_Strings);
package Json_Gen_String_Syntax is new Json_Gen_String_Switches.Set_Syntax
((Header_File => '=',
Output => '='));
package Json_Gen_String_Shorthands is new Json_Gen_String_Switches
.Set_Shorthands
((Header_File => null,
Output => +"-o"));
-- ???Perhaps Max_Line_Length, Indentation should be moved to Common, and
-- gnatpp and gnatstub shorthands unified. Output is also shared between
-- gnatpp and gnatstub. Or perhaps gnatstub should import Pp.Command_Lines.
type Json_Gen_Nats is
(Max_Line_Length,
Indentation,
Update_Body); -- undocumented
-- Update_Body is intended mainly for use by GPS or other text editors
package Json_Gen_Nat_Switches is new Other_Switches
(Descriptor,
Json_Gen_Nats,
Natural,
Natural'Image,
Natural'Value);
package Json_Gen_Nat_Syntax is new Json_Gen_Nat_Switches.Set_Syntax
((Max_Line_Length => '!',
Indentation => '!',
Update_Body => '='));
No_Update_Body : constant Natural := 0;
package Json_Gen_Nat_Defaults is new Json_Gen_Nat_Switches.Set_Defaults
((Max_Line_Length => 79,
Indentation => 3,
Update_Body => No_Update_Body));
package Json_Gen_Nat_Shorthands is new Json_Gen_Nat_Switches.Set_Shorthands
((Max_Line_Length => +"-gnatyM",
Indentation => +"-gnaty",
Update_Body => null));
package Json_Gen_Nat_Shorthands_2 is new Json_Gen_Nat_Switches.Set_Shorthands
((Max_Line_Length => +"-l",
Indentation => +"-i",
Update_Body => null));
package Freeze is new Freeze_Descriptor (Descriptor);
pragma Warnings (Off);
use Json_Gen_Flag_Switches,
Json_Gen_String_Switches,
Json_Gen_Nat_Switches;
pragma Warnings (On);
subtype Cmd_Line is Utils.Command_Lines.Command_Line;
function Update_Body_Specified (Cmd : Cmd_Line) return Boolean is
(Arg (Cmd, Update_Body) /= No_Update_Body);
-- If --update-body was not specified on the command line, then it will be
-- equal to the default (No_Update_Body).
end JSON_Gen.Command_Lines;
|
AaronC98/PlaneSystem | Ada | 23,589 | adb | ------------------------------------------------------------------------------
-- Ada Web Server --
-- --
-- Copyright (C) 2000-2014, AdaCore --
-- --
-- This library is free software; you can redistribute it and/or modify --
-- it under terms of the GNU General Public License as published by the --
-- Free Software Foundation; either version 3, or (at your option) any --
-- later version. This library is distributed in the hope that it will be --
-- useful, but WITHOUT ANY WARRANTY; without even the implied warranty of --
-- MERCHANTABILITY or FITNESS FOR A PARTICULAR PURPOSE. --
-- --
-- --
-- --
-- --
-- --
-- You should have received a copy of the GNU General Public License and --
-- a copy of the GCC Runtime Library Exception along with this program; --
-- see the files COPYING3 and COPYING.RUNTIME respectively. If not, see --
-- <http://www.gnu.org/licenses/>. --
-- --
-- --
-- --
-- --
-- --
-- --
-- --
------------------------------------------------------------------------------
pragma Ada_2012;
with Ada.Calendar;
with Ada.Command_Line;
with Ada.Directories;
with Ada.Strings.Fixed;
with Ada.Strings.Maps;
with Ada.Text_IO.C_Streams;
with GNAT.Calendar.Time_IO;
package body AWS.Log is
procedure Check_Split (Log : in out Object; Now : Ada.Calendar.Time);
-- Split log file if necessary
procedure Write_Callback (Log : in out Object; Data : in out Fields_Table);
-- Write extended format record to log file and prepare record for the next
-- data. It is not allowed to use same Fields_Table with different extended
-- logs.
procedure Write_File (Log : in out Object; Data : in out Fields_Table);
-- Write extended format record to log file and prepare record for the next
-- data. It is not allowed to use same Fields_Table with different extended
-- logs.
procedure Write_Log
(Log : in out Object;
Now : Calendar.Time;
Data : String);
-- Write data into the log file, change log file depending on the log file
-- split mode and Now.
function Get_Position (File : Ada.Text_IO.File_Type) return Natural
with Inline;
-- Returns current write position in the text file
-----------------
-- Check_Split --
-----------------
procedure Check_Split (Log : in out Object; Now : Ada.Calendar.Time) is
Keep_Split : Split_Mode;
begin
if (Log.Split = Daily
and then Log.Current_Tag /= Calendar.Day (Now))
or else
(Log.Split = Monthly
and then Log.Current_Tag /= Calendar.Month (Now))
then
-- Could not call Stop, because Stop would write to log again and
-- it cause unlimited recursion.
Text_IO.Close (Log.File);
Start (Log => Log,
Split => Log.Split,
Size_Limit => Log.Size_Limit,
File_Directory => To_String (Log.File_Directory),
Filename_Prefix => To_String (Log.Filename_Prefix),
Auto_Flush => Log.Auto_Flush);
elsif Log.Size_Limit > 0
and then Get_Position (Log.File) > Log.Size_Limit
then
Keep_Split := Log.Split;
Text_IO.Close (Log.File);
Start (Log => Log,
Split => Each_Run,
Size_Limit => Log.Size_Limit,
File_Directory => To_String (Log.File_Directory),
Filename_Prefix => To_String (Log.Filename_Prefix),
Auto_Flush => Log.Auto_Flush);
Log.Split := Keep_Split;
end if;
end Check_Split;
--------------
-- Filename --
--------------
function Filename (Log : Object) return String is
begin
if Text_IO.Is_Open (Log.File) then
return Text_IO.Name (Log.File);
elsif Log.Writer /= null then
return To_String (Log.Writer_Name);
else
return "";
end if;
end Filename;
--------------
-- Finalize --
--------------
overriding procedure Finalize (Log : in out Object) is
begin
Stop (Log);
end Finalize;
-----------
-- Flush --
-----------
procedure Flush (Log : in out Object) is
use Text_IO;
begin
if Log.Writer /= null or else Log.Auto_Flush then
return;
end if;
Log.Semaphore.Seize;
if Is_Open (Log.File) then
Flush (Log.File);
end if;
Log.Semaphore.Release;
exception
when others =>
Log.Semaphore.Release;
raise;
end Flush;
------------------
-- Get_Position --
------------------
function Get_Position (File : Ada.Text_IO.File_Type) return Natural is
use Ada.Text_IO.C_Streams;
begin
return Natural (ICS.ftell (C_Stream (File)));
end Get_Position;
---------------
-- Is_Active --
---------------
function Is_Active (Log : Object) return Boolean is
begin
return Text_IO.Is_Open (Log.File) or else Log.Writer /= null;
end Is_Active;
----------
-- Mode --
----------
function Mode (Log : Object) return Split_Mode is
begin
return Log.Split;
end Mode;
--------------------
-- Register_Field --
--------------------
procedure Register_Field (Log : in out Object; Id : String) is
Position : Strings_Positive.Cursor;
Success : Boolean;
begin
Log.Extended_Fields.Insert
(Id, Natural (Log.Extended_Fields.Length) + 1, Position, Success);
end Register_Field;
---------------
-- Set_Field --
---------------
procedure Set_Field
(Log : Object; Data : in out Fields_Table; Id, Value : String)
is
Ext_Len : constant Natural := Natural (Log.Extended_Fields.Length);
Data_Len : constant Natural := Natural (Data.Values.Length);
begin
if Ext_Len = 0 then
return;
end if;
if Data_Len = 0 then
-- Fields record is not initialized. We have to define fields set
-- with empty "-" values.
for J in 1 .. Ext_Len loop
Data.Values.Append ("-");
end loop;
elsif Data_Len /= Ext_Len then
-- Looks like the record was used with different log file
raise Constraint_Error;
end if;
declare
CSN : constant Strings_Positive.Cursor :=
Log.Extended_Fields.Find (Id);
begin
if Value /= "" and then Strings_Positive.Has_Element (CSN) then
Data.Values.Replace_Element
(Strings_Positive.Element (CSN), Value);
end if;
end;
end Set_Field;
-----------------------
-- Set_Header_Fields --
-----------------------
procedure Set_Header_Fields
(Log : Object;
Data : in out Fields_Table;
Prefix : String;
Header : AWS.Headers.List)
is
procedure Process (Name, Value : String);
-------------
-- Process --
-------------
procedure Process (Name, Value : String) is
begin
Set_Field
(Log, Data, Prefix & '(' & Name & ')',
AWS.Utils.Quote (Value, """"""));
end Process;
begin
Header.Iterate_Names (", ", Process'Access);
end Set_Header_Fields;
-----------
-- Start --
-----------
procedure Start
(Log : in out Object;
Split : Split_Mode := None;
Size_Limit : Natural := 0;
File_Directory : String := Not_Specified;
Filename_Prefix : String := Not_Specified;
Auto_Flush : Boolean := False)
is
function Get_Prefix return String;
-- Returns the prefix to use for the log filename
function Log_Prefix (Prefix : String) return String;
-- Returns the prefix to be added before the log filename. The returned
-- value is the executable name without directory and filetype if Prefix
-- is Not_Specified otherwise Prefix is returned.
Now : constant Calendar.Time := Calendar.Clock;
----------------
-- Get_Prefix --
----------------
function Get_Prefix return String is
begin
if Split = None then
return Utils.Normalized_Directory (File_Directory)
& Log_Prefix (Filename_Prefix);
else
return Utils.Normalized_Directory (File_Directory)
& Log_Prefix (Filename_Prefix) & '-'
& GNAT.Calendar.Time_IO.Image (Now, "%Y-%m-%d");
end if;
end Get_Prefix;
----------------
-- Log_Prefix --
----------------
function Log_Prefix (Prefix : String) return String is
function Prog_Name return String;
-- Return current program name
---------------
-- Prog_Name --
---------------
function Prog_Name return String is
Name : constant String := Ada.Command_Line.Command_Name;
First : Natural;
Last : Natural;
begin
First := Strings.Fixed.Index
(Name, Strings.Maps.To_Set ("/\"), Going => Strings.Backward);
if First = 0 then
First := Name'First;
else
First := First + 1;
end if;
Last := Strings.Fixed.Index
(Name (First .. Name'Last), ".", Strings.Backward);
if Last = 0 then
Last := Name'Last;
else
Last := Last - 1;
end if;
return Name (First .. Last);
end Prog_Name;
begin
if Prefix = Not_Specified then
return "";
else
declare
K : constant Natural := Strings.Fixed.Index (Prefix, "@");
begin
if K = 0 then
return Prefix;
else
return Prefix (Prefix'First .. K - 1)
& Prog_Name & Prefix (K + 1 .. Prefix'Last);
end if;
end;
end if;
end Log_Prefix;
Prefix : constant String := Get_Prefix;
Filename : Unbounded_String;
Time_Part : String (1 .. 7);
begin
Log.Filename_Prefix := To_Unbounded_String (Filename_Prefix);
Log.File_Directory := To_Unbounded_String (File_Directory);
Log.Split := Split;
Log.Size_Limit := Size_Limit;
Log.Auto_Flush := Auto_Flush;
Log.Header_Written := False;
Log.Stop_Has_Been_Called := False;
Filename := To_Unbounded_String (Prefix & ".log");
case Split is
when None =>
null;
when Each_Run =>
if Directories.Exists (To_String (Filename)) then
Time_Part := GNAT.Calendar.Time_IO.Image (Now, "-%H%M%S");
Filename := To_Unbounded_String (Prefix & Time_Part & ".log");
for K in 1 .. 99 loop
exit when not Directories.Exists (To_String (Filename));
Filename :=
To_Unbounded_String
(Prefix & Time_Part & '-' & Utils.Image (K) & ".log");
end loop;
end if;
when Daily =>
Log.Current_Tag := Ada.Calendar.Day (Now);
when Monthly =>
Log.Current_Tag := Ada.Calendar.Month (Now);
end case;
Text_IO.Open (Log.File, Text_IO.Append_File, To_String (Filename));
exception
when Text_IO.Name_Error =>
Text_IO.Create (Log.File, Text_IO.Out_File, To_String (Filename));
end Start;
-----------
-- Start --
-----------
procedure Start
(Log : in out Object;
Writer : Callback;
Name : String) is
begin
Log.Writer := Writer;
Log.Writer_Name := To_Unbounded_String (Name);
Log.Header_Written := False;
Log.Stop_Has_Been_Called := False;
end Start;
----------
-- Stop --
----------
procedure Stop (Log : in out Object) is
begin
if not Log.Stop_Has_Been_Called then
if Log.Writer = null then
if Text_IO.Is_Open (Log.File) then
Write (Log, "Stop logging.");
Text_IO.Close (Log.File);
end if;
else
Log.Writer ("Stop logging.");
Log.Writer := null;
end if;
end if;
Log.Stop_Has_Been_Called := True;
end Stop;
-----------
-- Write --
-----------
-- Here is the log format compatible with Apache:
--
-- 127.0.0.1 - - [25/Apr/1998:15:37:29 +0200] "GET / HTTP/1.0" 200 1363
--
-- See http://httpd.apache.org/docs/trunk/logs.html
procedure Write
(Log : in out Object;
Connect_Stat : Status.Data;
Answer : Response.Data) is
begin
Write (Log, Connect_Stat,
Response.Status_Code (Answer),
Response.Content_Length (Answer));
end Write;
procedure Write
(Log : in out Object;
Connect_Stat : Status.Data;
Status_Code : Messages.Status_Code;
Content_Length : Response.Content_Length_Type)
is
use type Response.Content_Length_Type;
function Length_Image return String is
(if Content_Length = Response.Undefined_Length
then ""
else Utils.Image (Content_Length)) with Inline;
begin
Write
(Log, Connect_Stat, Messages.Image (Status_Code) & ' ' & Length_Image);
end Write;
procedure Write
(Log : in out Object;
Connect_Stat : Status.Data;
Data : String)
is
Now : constant Calendar.Time := Calendar.Clock;
function Authorization_Name return String with Inline;
------------------------
-- Authorization_Name --
------------------------
function Authorization_Name return String is
Result : constant String := Status.Authorization_Name (Connect_Stat);
begin
if Result = "" then
return "-";
else
return Result;
end if;
end Authorization_Name;
Log_Message : constant String :=
AWS.Status.Peername (Connect_Stat)
& " - " & Authorization_Name
& " ["
& GNAT.Calendar.Time_IO.Image (Now, "%d/%b/%Y:%T")
& "] """
& Status.Method (Connect_Stat)
& ' '
& Status.URI (Connect_Stat) & " "
& Status.HTTP_Version (Connect_Stat) & """ "
& Data;
begin
if Log.Writer = null then
Write_Log (Log, Now, Log_Message);
else
Log.Writer (Log_Message);
end if;
end Write;
procedure Write (Log : in out Object; Data : String) is
Now : constant Calendar.Time := Calendar.Clock;
Log_Message : constant String := "["
& GNAT.Calendar.Time_IO.Image
(Now, "%d/%b/%Y:%T") & "] " & Data;
begin
if Log.Writer = null then
Write_Log (Log, Now, Log_Message);
else
Log.Writer (Log_Message);
end if;
end Write;
-- Here is the extended log format:
--
-- #Version: 1.0
-- #Date: 12-Jan-1996 00:00:00
-- #Fields: time cs-method cs-uri
-- 00:34:23 GET /foo/bar.html
procedure Write (Log : in out Object; Data : in out Fields_Table) is
begin
if Log.Writer = null then
Write_File (Log, Data);
else
Write_Callback (Log, Data);
end if;
end Write;
----------------------
-- Write_Callback --
----------------------
procedure Write_Callback
(Log : in out Object; Data : in out Fields_Table)
is
use GNAT.Calendar.Time_IO;
Length : constant Natural := Natural (Log.Extended_Fields.Length);
Message : Unbounded_String := Null_Unbounded_String;
Now : Ada.Calendar.Time;
procedure Write_And_Clear (Position : SV.Cursor);
---------------------
-- Write_And_Clear --
---------------------
procedure Write_And_Clear (Position : SV.Cursor) is
begin
Utils.Append_With_Sep (Message, SV.Element (Position), Sep => " ");
Data.Values.Replace_Element (Position, "-");
end Write_And_Clear;
begin
if Length = 0 then
-- It is not extended log
return;
end if;
Now := Ada.Calendar.Clock;
if not Log.Header_Written then
Log.Header_Written := True;
Log.Writer ("#Software: AWS (Ada Web Server) v" & Version);
Log.Writer ("#Date: " & Image (Now, ISO_Date & " %T"));
Log.Writer ("#Fields:");
declare
Fields : Unbounded_String := Null_Unbounded_String;
Order : array (1 .. Length) of Strings_Positive.Cursor;
procedure Process (Position : Strings_Positive.Cursor);
-------------
-- Process --
-------------
procedure Process (Position : Strings_Positive.Cursor)
is
begin
Order (Strings_Positive.Element (Position)) := Position;
end Process;
begin
Log.Extended_Fields.Iterate (Process'Access);
for J in Order'Range loop
Append (Fields, ' ' & Strings_Positive.Key (Order (J)));
end loop;
Log.Writer (To_String (Fields));
end;
end if;
-- Set date and time fields if the used does not fill it
declare
CSN : Strings_Positive.Cursor := Log.Extended_Fields.Find ("date");
P : Positive;
begin
if Strings_Positive.Has_Element (CSN) then
P := Strings_Positive.Element (CSN);
if Data.Values.Element (P) = "-" then
Data.Values.Replace_Element (P, Image (Now, ISO_Date));
end if;
end if;
CSN := Log.Extended_Fields.Find ("time");
if Strings_Positive.Has_Element (CSN) then
P := Strings_Positive.Element (CSN);
if Data.Values.Element (P) = "-" then
Data.Values.Replace_Element (P, Image (Now, "%T"));
end if;
end if;
end;
Data.Values.Iterate (Write_And_Clear'Access);
Log.Writer (To_String (Message));
end Write_Callback;
------------------
-- Write_File --
------------------
procedure Write_File (Log : in out Object; Data : in out Fields_Table) is
use GNAT.Calendar.Time_IO;
Length : constant Natural := Natural (Log.Extended_Fields.Length);
Now : Ada.Calendar.Time;
First_Field : Boolean := True;
procedure Write_And_Clear (Position : SV.Cursor);
---------------------
-- Write_And_Clear --
---------------------
procedure Write_And_Clear (Position : SV.Cursor) is
begin
if First_Field then
First_Field := False;
Text_IO.Put (Log.File, SV.Element (Position));
else
Text_IO.Put (Log.File, ' ' & SV.Element (Position));
end if;
Data.Values.Replace_Element (Position, "-");
end Write_And_Clear;
begin
if Length = 0 then
-- It is not extended log
return;
end if;
Log.Semaphore.Seize;
if Text_IO.Is_Open (Log.File) then
Now := Ada.Calendar.Clock;
Check_Split (Log, Now);
if not Log.Header_Written then
Log.Header_Written := True;
Text_IO.Put_Line (Log.File, "#Version: 1.0");
Text_IO.Put_Line
(Log.File, "#Software: AWS (Ada Web Server) v" & Version);
Text_IO.Put_Line
(Log.File, "#Date: " & Image (Now, ISO_Date & " %T"));
Text_IO.Put (Log.File, "#Fields:");
declare
Order : array (1 .. Length) of Strings_Positive.Cursor;
procedure Process (Position : Strings_Positive.Cursor);
-------------
-- Process --
-------------
procedure Process (Position : Strings_Positive.Cursor) is
begin
Order (Strings_Positive.Element (Position)) := Position;
end Process;
begin
Log.Extended_Fields.Iterate (Process'Access);
for J in Order'Range loop
Text_IO.Put
(Log.File, ' ' & Strings_Positive.Key (Order (J)));
end loop;
Text_IO.New_Line (Log.File);
end;
end if;
-- Set date and time fields if the used does not fill it
declare
CSN : Strings_Positive.Cursor := Log.Extended_Fields.Find ("date");
P : Positive;
begin
if Strings_Positive.Has_Element (CSN) then
P := Strings_Positive.Element (CSN);
if Data.Values.Element (P) = "-" then
Data.Values.Replace_Element (P, Image (Now, ISO_Date));
end if;
end if;
CSN := Log.Extended_Fields.Find ("time");
if Strings_Positive.Has_Element (CSN) then
P := Strings_Positive.Element (CSN);
if Data.Values.Element (P) = "-" then
Data.Values.Replace_Element (P, Image (Now, "%T"));
end if;
end if;
end;
Data.Values.Iterate (Write_And_Clear'Access);
Text_IO.New_Line (Log.File);
if Log.Auto_Flush then
Text_IO.Flush (Log.File);
end if;
end if;
Log.Semaphore.Release;
exception
when others =>
Log.Semaphore.Release;
raise;
end Write_File;
---------------
-- Write_Log --
---------------
procedure Write_Log
(Log : in out Object;
Now : Calendar.Time;
Data : String) is
begin
Log.Semaphore.Seize;
if Text_IO.Is_Open (Log.File) then
Check_Split (Log, Now);
Text_IO.Put_Line (Log.File, Data);
if Log.Auto_Flush then
Text_IO.Flush (Log.File);
end if;
end if;
Log.Semaphore.Release;
exception
when others =>
Log.Semaphore.Release;
raise;
end Write_Log;
end AWS.Log;
|
io7m/coreland-vector-ada | Ada | 249 | ads | generic package vector.assign is
-- assign, in place
procedure f
(a : in out vector_f_t;
b : in vector_f_t);
pragma inline (f);
procedure d
(a : in out vector_d_t;
b : in vector_d_t);
pragma inline (d);
end vector.assign;
|
apple-oss-distributions/old_ncurses | Ada | 3,030 | ads | ------------------------------------------------------------------------------
-- --
-- GNAT ncurses Binding Samples --
-- --
-- ncurses --
-- --
-- B O D Y --
-- --
------------------------------------------------------------------------------
-- Copyright (c) 2000 Free Software Foundation, Inc. --
-- --
-- Permission is hereby granted, free of charge, to any person obtaining a --
-- copy of this software and associated documentation files (the --
-- "Software"), to deal in the Software without restriction, including --
-- without limitation the rights to use, copy, modify, merge, publish, --
-- distribute, distribute with modifications, sublicense, and/or sell --
-- copies of the Software, and to permit persons to whom the Software is --
-- furnished to do so, subject to the following conditions: --
-- --
-- The above copyright notice and this permission notice shall be included --
-- in all copies or substantial portions of the Software. --
-- --
-- THE SOFTWARE IS PROVIDED "AS IS", WITHOUT WARRANTY OF ANY KIND, EXPRESS --
-- OR IMPLIED, INCLUDING BUT NOT LIMITED TO THE WARRANTIES OF --
-- MERCHANTABILITY, FITNESS FOR A PARTICULAR PURPOSE AND NONINFRINGEMENT. --
-- IN NO EVENT SHALL THE ABOVE COPYRIGHT HOLDERS BE LIABLE FOR ANY CLAIM, --
-- DAMAGES OR OTHER LIABILITY, WHETHER IN AN ACTION OF CONTRACT, TORT OR --
-- OTHERWISE, ARISING FROM, OUT OF OR IN CONNECTION WITH THE SOFTWARE OR --
-- THE USE OR OTHER DEALINGS IN THE SOFTWARE. --
-- --
-- Except as contained in this notice, the name(s) of the above copyright --
-- holders shall not be used in advertising or otherwise to promote the --
-- sale, use or other dealings in this Software without prior written --
-- authorization. --
------------------------------------------------------------------------------
-- Author: Eugene V. Melaragno <[email protected]> 2000
-- Version Control
-- $Revision: 1.1.1.1 $
-- Binding Version 01.00
------------------------------------------------------------------------------
procedure ncurses2.demo_panels (nap_mseci : Integer);
|
reznikmm/matreshka | Ada | 4,809 | ads | ------------------------------------------------------------------------------
-- --
-- Matreshka Project --
-- --
-- Open Document Toolkit --
-- --
-- Runtime Library Component --
-- --
------------------------------------------------------------------------------
-- --
-- Copyright © 2014, Vadim Godunko <[email protected]> --
-- All rights reserved. --
-- --
-- Redistribution and use in source and binary forms, with or without --
-- modification, are permitted provided that the following conditions --
-- are met: --
-- --
-- * Redistributions of source code must retain the above copyright --
-- notice, this list of conditions and the following disclaimer. --
-- --
-- * Redistributions in binary form must reproduce the above copyright --
-- notice, this list of conditions and the following disclaimer in the --
-- documentation and/or other materials provided with the distribution. --
-- --
-- * Neither the name of the Vadim Godunko, IE nor the names of its --
-- contributors may be used to endorse or promote products derived from --
-- this software without specific prior written permission. --
-- --
-- THIS SOFTWARE IS PROVIDED BY THE COPYRIGHT HOLDERS AND CONTRIBUTORS --
-- "AS IS" AND ANY EXPRESS OR IMPLIED WARRANTIES, INCLUDING, BUT NOT --
-- LIMITED TO, THE IMPLIED WARRANTIES OF MERCHANTABILITY AND FITNESS FOR --
-- A PARTICULAR PURPOSE ARE DISCLAIMED. IN NO EVENT SHALL THE COPYRIGHT --
-- HOLDER OR CONTRIBUTORS BE LIABLE FOR ANY DIRECT, INDIRECT, INCIDENTAL, --
-- SPECIAL, EXEMPLARY, OR CONSEQUENTIAL DAMAGES (INCLUDING, BUT NOT LIMITED --
-- TO, PROCUREMENT OF SUBSTITUTE GOODS OR SERVICES; LOSS OF USE, DATA, OR --
-- PROFITS; OR BUSINESS INTERRUPTION) HOWEVER CAUSED AND ON ANY THEORY OF --
-- LIABILITY, WHETHER IN CONTRACT, STRICT LIABILITY, OR TORT (INCLUDING --
-- NEGLIGENCE OR OTHERWISE) ARISING IN ANY WAY OUT OF THE USE OF THIS --
-- SOFTWARE, EVEN IF ADVISED OF THE POSSIBILITY OF SUCH DAMAGE. --
-- --
------------------------------------------------------------------------------
-- $Revision$ $Date$
------------------------------------------------------------------------------
with XML.DOM.Visitors;
with ODF.DOM.Office_Document_Content_Elements;
package Matreshka.ODF_Office.Document_Content_Elements is
type Office_Document_Content_Element_Node is
new Matreshka.ODF_Office.Abstract_Office_Element_Node
and ODF.DOM.Office_Document_Content_Elements.ODF_Office_Document_Content
with null record;
overriding function Create
(Parameters : not null access Matreshka.DOM_Elements.Element_L2_Parameters)
return Office_Document_Content_Element_Node;
overriding function Get_Local_Name
(Self : not null access constant Office_Document_Content_Element_Node)
return League.Strings.Universal_String;
overriding procedure Enter_Node
(Self : not null access Office_Document_Content_Element_Node;
Visitor : in out XML.DOM.Visitors.Abstract_Visitor'Class;
Control : in out XML.DOM.Visitors.Traverse_Control);
overriding procedure Leave_Node
(Self : not null access Office_Document_Content_Element_Node;
Visitor : in out XML.DOM.Visitors.Abstract_Visitor'Class;
Control : in out XML.DOM.Visitors.Traverse_Control);
overriding procedure Visit_Node
(Self : not null access Office_Document_Content_Element_Node;
Iterator : in out XML.DOM.Visitors.Abstract_Iterator'Class;
Visitor : in out XML.DOM.Visitors.Abstract_Visitor'Class;
Control : in out XML.DOM.Visitors.Traverse_Control);
end Matreshka.ODF_Office.Document_Content_Elements;
|
stcarrez/ada-asf | Ada | 2,314 | ads | -----------------------------------------------------------------------
-- asf-navigations-tests - Tests for ASF navigation
-- Copyright (C) 2013, 2018 Stephane Carrez
-- Written by Stephane Carrez ([email protected])
--
-- Licensed under the Apache License, Version 2.0 (the "License");
-- you may not use this file except in compliance with the License.
-- You may obtain a copy of the License at
--
-- http://www.apache.org/licenses/LICENSE-2.0
--
-- Unless required by applicable law or agreed to in writing, software
-- distributed under the License is distributed on an "AS IS" BASIS,
-- WITHOUT WARRANTIES OR CONDITIONS OF ANY KIND, either express or implied.
-- See the License for the specific language governing permissions and
-- limitations under the License.
-----------------------------------------------------------------------
with Util.Tests;
package ASF.Navigations.Tests is
procedure Add_Tests (Suite : in Util.Tests.Access_Test_Suite);
type Test is new Util.Tests.Test with null record;
-- Initialize the test application
overriding
procedure Set_Up (T : in out Test);
-- Test a form navigation with an exact match (view, outcome, action).
procedure Test_Exact_Navigation (T : in out Test);
-- Test a form navigation with a partial match (view, outcome).
procedure Test_Partial_Navigation (T : in out Test);
-- Test a form navigation with a exception match (view, outcome).
procedure Test_Exception_Navigation (T : in out Test);
-- Test a form navigation with a wildcard match on the URI (view, outcome).
procedure Test_Wildcard_Navigation (T : in out Test);
-- Test a form navigation with a condition (view, outcome, condition).
procedure Test_Conditional_Navigation (T : in out Test);
-- Test a navigation rule with a status.
procedure Test_Status_Navigation (T : in out Test);
-- Check the navigation for an URI and expect the result to match the regular expression.
procedure Check_Navigation (T : in out Test;
Name : in String;
Match : in String;
Raise_Flag : in Boolean := False;
Status : in Natural := 200);
end ASF.Navigations.Tests;
|
Subsets and Splits
No community queries yet
The top public SQL queries from the community will appear here once available.