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,199
adb
------------------------------------------------------------------------------ -- -- -- Matreshka Project -- -- -- -- Open Document Toolkit -- -- -- -- Runtime Library Component -- -- -- ------------------------------------------------------------------------------ -- -- -- Copyright © 2013, Vadim Godunko <[email protected]> -- -- All rights reserved. -- -- -- -- Redistribution and use in source and binary forms, with or without -- -- modification, are permitted provided that the following conditions -- -- are met: -- -- -- -- * Redistributions of source code must retain the above copyright -- -- notice, this list of conditions and the following disclaimer. -- -- -- -- * Redistributions in binary form must reproduce the above copyright -- -- notice, this list of conditions and the following disclaimer in the -- -- documentation and/or other materials provided with the distribution. -- -- -- -- * Neither the name of the Vadim Godunko, IE nor the names of its -- -- contributors may be used to endorse or promote products derived from -- -- this software without specific prior written permission. -- -- -- -- THIS SOFTWARE IS PROVIDED BY THE COPYRIGHT HOLDERS AND CONTRIBUTORS -- -- "AS IS" AND ANY EXPRESS OR IMPLIED WARRANTIES, INCLUDING, BUT NOT -- -- LIMITED TO, THE IMPLIED WARRANTIES OF MERCHANTABILITY AND FITNESS FOR -- -- A PARTICULAR PURPOSE ARE DISCLAIMED. IN NO EVENT SHALL THE COPYRIGHT -- -- HOLDER OR CONTRIBUTORS BE LIABLE FOR ANY DIRECT, INDIRECT, INCIDENTAL, -- -- SPECIAL, EXEMPLARY, OR CONSEQUENTIAL DAMAGES (INCLUDING, BUT NOT LIMITED -- -- TO, PROCUREMENT OF SUBSTITUTE GOODS OR SERVICES; LOSS OF USE, DATA, OR -- -- PROFITS; OR BUSINESS INTERRUPTION) HOWEVER CAUSED AND ON ANY THEORY OF -- -- LIABILITY, WHETHER IN CONTRACT, STRICT LIABILITY, OR TORT (INCLUDING -- -- NEGLIGENCE OR OTHERWISE) ARISING IN ANY WAY OUT OF THE USE OF THIS -- -- SOFTWARE, EVEN IF ADVISED OF THE POSSIBILITY OF SUCH DAMAGE. -- -- -- ------------------------------------------------------------------------------ -- $Revision$ $Date$ ------------------------------------------------------------------------------ with Matreshka.DOM_Nodes; with XML.DOM.Attributes.Internals; package body ODF.DOM.Attributes.Table.Name.Internals is ------------ -- Create -- ------------ function Create (Node : Matreshka.ODF_Attributes.Table.Name.Table_Name_Access) return ODF.DOM.Attributes.Table.Name.ODF_Table_Name is begin return (XML.DOM.Attributes.Internals.Create (Matreshka.DOM_Nodes.Attribute_Access (Node)) with null record); end Create; ---------- -- Wrap -- ---------- function Wrap (Node : Matreshka.ODF_Attributes.Table.Name.Table_Name_Access) return ODF.DOM.Attributes.Table.Name.ODF_Table_Name is begin return (XML.DOM.Attributes.Internals.Wrap (Matreshka.DOM_Nodes.Attribute_Access (Node)) with null record); end Wrap; end ODF.DOM.Attributes.Table.Name.Internals;
rbkmoney/swagger-codegen
Ada
31
ads
package Samples is end Samples;
LiberatorUSA/GUCEF
Ada
4,428
ads
with agar.core.event; with agar.gui.text; with agar.gui.widget.icon; package agar.gui.widget.socket is use type c.unsigned; type bg_type_t is (SOCKET_PIXMAP, SOCKET_RECT, SOCKET_CIRCLE); for bg_type_t use (SOCKET_PIXMAP => 0, SOCKET_RECT => 1, SOCKET_CIRCLE => 2); for bg_type_t'size use c.unsigned'size; pragma convention (c, bg_type_t); type flags_t is new c.unsigned; SOCKET_HFILL : constant flags_t := 16#01#; SOCKET_VFILL : constant flags_t := 16#02#; SOCKET_EXPAND : constant flags_t := SOCKET_HFILL or SOCKET_VFILL; SOCKET_MOUSEOVER : constant flags_t := 16#04#; STICKY_STATE : constant flags_t := 16#08#; type socket_t is limited private; type socket_access_t is access all socket_t; pragma convention (c, socket_access_t); type insert_callback_t is access function (socket : socket_access_t; icon : agar.gui.widget.icon.icon_access_t) return c.int; pragma convention (c, insert_callback_t); type remove_callback_t is access procedure (socket : socket_access_t; icon : agar.gui.widget.icon.icon_access_t); pragma convention (c, remove_callback_t); -- API function allocate (parent : widget_access_t; flags : flags_t) return socket_access_t; pragma import (c, allocate, "AG_SocketNew"); function from_surface (parent : widget_access_t; flags : flags_t; surface : agar.gui.surface.surface_access_t) return socket_access_t; pragma import (c, from_surface, "AG_SocketFromSurface"); function from_bitmap (parent : widget_access_t; flags : flags_t; file : string) return socket_access_t; pragma inline (from_bitmap); procedure set_insert_callback (socket : socket_access_t; callback : insert_callback_t); pragma import (c, set_insert_callback, "AG_SocketInsertFn"); procedure set_remove_callback (socket : socket_access_t; callback : remove_callback_t); pragma import (c, set_remove_callback, "AG_SocketRemoveFn"); procedure set_padding (socket : socket_access_t; left : natural; right : natural; top : natural; bottom : natural); pragma inline (set_padding); procedure shape_rectangle (socket : socket_access_t; width : natural; height : natural); pragma inline (shape_rectangle); procedure shape_circle (socket : socket_access_t; radius : natural); pragma inline (shape_circle); procedure shape_pixmap (socket : socket_access_t; surface : agar.gui.surface.surface_access_t); pragma import (c, shape_pixmap, "AG_SocketBgPixmap"); procedure shape_pixmap_no_copy (socket : socket_access_t; surface : agar.gui.surface.surface_access_t); pragma import (c, shape_pixmap_no_copy, "AG_SocketBgPixmapNODUP"); function widget (socket : socket_access_t) return widget_access_t; pragma inline (widget); function icon (socket : socket_access_t) return agar.gui.widget.icon.icon_access_t; pragma inline (icon); private type pixmap_t is record s : c.int; end record; pragma convention (c, pixmap_t); type rect_t is record w : c.int; h : c.int; end record; pragma convention (c, rect_t); type circle_t is record r : c.int; end record; pragma convention (c, circle_t); type bg_data_selector_t is (DATA_PIXMAP, DATA_RECT, DATA_CIRCLE); type bg_data_t (member : bg_data_selector_t := DATA_PIXMAP) is record case member is when DATA_PIXMAP => pixmap : pixmap_t; when DATA_RECT => rect : rect_t; when DATA_CIRCLE => circle : circle_t; end case; end record; pragma convention (c, bg_data_t); pragma unchecked_union (bg_data_t); type socket_t is record widget : aliased widget_t; state : c.int; count : c.int; flags : flags_t; bg_type : bg_type_t; bg_data : bg_data_t; justify : agar.gui.text.justify_t; pad_left : c.int; pad_right : c.int; pad_top : c.int; pad_bottom : c.int; icon : agar.gui.widget.icon.icon_access_t; insert_fn : access function (sock : socket_access_t; icon : agar.gui.widget.icon.icon_access_t) return c.int; remove_fn : access procedure (sock : socket_access_t; icon : agar.gui.widget.icon.icon_access_t); overlay_fn : agar.core.event.event_access_t; end record; pragma convention (c, socket_t); end agar.gui.widget.socket;
reznikmm/matreshka
Ada
5,361
ads
------------------------------------------------------------------------------ -- -- -- Matreshka Project -- -- -- -- Ada Modeling Framework -- -- -- -- Runtime Library Component -- -- -- ------------------------------------------------------------------------------ -- -- -- Copyright © 2011-2012, Vadim Godunko <[email protected]> -- -- All rights reserved. -- -- -- -- Redistribution and use in source and binary forms, with or without -- -- modification, are permitted provided that the following conditions -- -- are met: -- -- -- -- * Redistributions of source code must retain the above copyright -- -- notice, this list of conditions and the following disclaimer. -- -- -- -- * Redistributions in binary form must reproduce the above copyright -- -- notice, this list of conditions and the following disclaimer in the -- -- documentation and/or other materials provided with the distribution. -- -- -- -- * Neither the name of the Vadim Godunko, IE nor the names of its -- -- contributors may be used to endorse or promote products derived from -- -- this software without specific prior written permission. -- -- -- -- THIS SOFTWARE IS PROVIDED BY THE COPYRIGHT HOLDERS AND CONTRIBUTORS -- -- "AS IS" AND ANY EXPRESS OR IMPLIED WARRANTIES, INCLUDING, BUT NOT -- -- LIMITED TO, THE IMPLIED WARRANTIES OF MERCHANTABILITY AND FITNESS FOR -- -- A PARTICULAR PURPOSE ARE DISCLAIMED. IN NO EVENT SHALL THE COPYRIGHT -- -- HOLDER OR CONTRIBUTORS BE LIABLE FOR ANY DIRECT, INDIRECT, INCIDENTAL, -- -- SPECIAL, EXEMPLARY, OR CONSEQUENTIAL DAMAGES (INCLUDING, BUT NOT LIMITED -- -- TO, PROCUREMENT OF SUBSTITUTE GOODS OR SERVICES; LOSS OF USE, DATA, OR -- -- PROFITS; OR BUSINESS INTERRUPTION) HOWEVER CAUSED AND ON ANY THEORY OF -- -- LIABILITY, WHETHER IN CONTRACT, STRICT LIABILITY, OR TORT (INCLUDING -- -- NEGLIGENCE OR OTHERWISE) ARISING IN ANY WAY OUT OF THE USE OF THIS -- -- SOFTWARE, EVEN IF ADVISED OF THE POSSIBILITY OF SUCH DAMAGE. -- -- -- ------------------------------------------------------------------------------ -- $Revision$ $Date$ ------------------------------------------------------------------------------ -- This file is generated, don't edit it. ------------------------------------------------------------------------------ with AMF.Generic_Collections; package AMF.CMOF.Directed_Relationships.Collections is pragma Preelaborate; package CMOF_Directed_Relationship_Collections is new AMF.Generic_Collections (CMOF_Directed_Relationship, CMOF_Directed_Relationship_Access); type Set_Of_CMOF_Directed_Relationship is new CMOF_Directed_Relationship_Collections.Set with null record; Empty_Set_Of_CMOF_Directed_Relationship : constant Set_Of_CMOF_Directed_Relationship; type Ordered_Set_Of_CMOF_Directed_Relationship is new CMOF_Directed_Relationship_Collections.Ordered_Set with null record; Empty_Ordered_Set_Of_CMOF_Directed_Relationship : constant Ordered_Set_Of_CMOF_Directed_Relationship; type Bag_Of_CMOF_Directed_Relationship is new CMOF_Directed_Relationship_Collections.Bag with null record; Empty_Bag_Of_CMOF_Directed_Relationship : constant Bag_Of_CMOF_Directed_Relationship; type Sequence_Of_CMOF_Directed_Relationship is new CMOF_Directed_Relationship_Collections.Sequence with null record; Empty_Sequence_Of_CMOF_Directed_Relationship : constant Sequence_Of_CMOF_Directed_Relationship; private Empty_Set_Of_CMOF_Directed_Relationship : constant Set_Of_CMOF_Directed_Relationship := (CMOF_Directed_Relationship_Collections.Set with null record); Empty_Ordered_Set_Of_CMOF_Directed_Relationship : constant Ordered_Set_Of_CMOF_Directed_Relationship := (CMOF_Directed_Relationship_Collections.Ordered_Set with null record); Empty_Bag_Of_CMOF_Directed_Relationship : constant Bag_Of_CMOF_Directed_Relationship := (CMOF_Directed_Relationship_Collections.Bag with null record); Empty_Sequence_Of_CMOF_Directed_Relationship : constant Sequence_Of_CMOF_Directed_Relationship := (CMOF_Directed_Relationship_Collections.Sequence with null record); end AMF.CMOF.Directed_Relationships.Collections;
stcarrez/ada-enet
Ada
6,725
ads
----------------------------------------------------------------------- -- net-dns -- DNS Network utilities -- Copyright (C) 2016, 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.Real_Time; with Net.Interfaces; with Net.Buffers; with Net.Sockets.Udp; -- == DNS Client == -- The DNS client is used to make a DNS resolution and resolve a hostname to get an IP address -- (RFC 1035). The client implementation is based on the UDP client sockets and it uses a -- random UDP port to receive the DNS response. -- -- === Initialization === -- The DNS client is represented by the <tt>Query</tt> tagged type. An instance must be declared -- for each hostname that must be resolved. -- -- Client : Net.DNS.Query; -- -- === Hostname resolution === -- The hostname resolution is started by calling the <tt>Resolve</tt> operation on the query -- object. That operation needs an access to the network interface to be able to send the -- DNS query packet. It returns a status code that indicates whether the packet was sent or not. -- -- Client.Resolve (Ifnet'Access, "www.google.com", Status); -- -- The DNS resolution is asynchronous. The <tt>Resolve</tt> operation does not wait for the -- response. The <tt>Get_Status</tt> operation can be used to look at the progress of the DNS -- query. The value <tt>PENDING</tt> indicates that a request was sent but no response was -- received yet. The value <tt>NOERROR</tt> indicates that the DNS resolution was successful. -- -- Once the <tt>Get_Status</tt> operation returns the <tt>NOERROR</tt> value, the IPv4 address -- can be obtained by using the <tt>Get_Ip</tt> function. -- -- IP : Net.Ip_Addr := Client.Get_Ip; package Net.DNS is -- Maximum length allowed for a hostname resolution. DNS_NAME_MAX_LENGTH : constant Positive := 255; -- Maximum length accepted by a response anwser. The official limit is 64K but this -- implementation limits the length of DNS records to 512 bytes which is more than acceptable. DNS_VALUE_MAX_LENGTH : constant Positive := 512; -- The DNS query status. type Status_Type is (NOQUERY, NOERROR, FORMERR, SERVFAIL, NXDOMAIN, NOTIMP, REFUSED, YXDOMAIN, XRRSET, NOTAUTH, NOTZONE, OTHERERROR, PENDING); -- The DNS record type is a 16-bit number. type RR_Type is new Net.Uint16; -- Common standard DNS record type values from RFC 1035, RFC 3586) -- (See http://www.iana.org/assignments/dns-parameters/dns-parameters.xhtml) A_RR : constant RR_Type := 1; NS_RR : constant RR_Type := 2; CNAME_RR : constant RR_Type := 5; PTR_RR : constant RR_Type := 12; MX_RR : constant RR_Type := 15; TXT_RR : constant RR_Type := 16; AAAA_RR : constant RR_Type := 28; -- The possible value types in the response. type Value_Type is (V_NONE, V_TEXT, V_IPV4, V_IPV6); -- The Response_Type record describes a response anwser that was received from the -- DNS server. The DNS server can send several response answers in the same packet. -- The answer data is extracted according to the RR type and made available as String, -- IPv4 and in the future IPv6. type Response_Type (Kind : Value_Type; Of_Type : RR_Type; Len : Natural) is record Class : Net.Uint16; Ttl : Net.Uint32; case Kind is when V_TEXT => -- CNAME_RR | TXT_RR | MX_RR | NS_RR | PTR_RR Text : String (1 .. Len); when V_IPV4 => -- A_RR Ip : Net.Ip_Addr; when others => null; end case; end record; type Query is new Net.Sockets.Udp.Socket with private; function Get_Status (Request : in Query) return Status_Type; -- Get the name defined for the DNS query. function Get_Name (Request : in Query) return String; -- Get the IP address that was resolved by the DNS query. function Get_Ip (Request : in Query) return Net.Ip_Addr; -- Get the TTL associated with the response. function Get_Ttl (Request : in Query) return Net.Uint32; -- Start a DNS resolution for the given hostname. procedure Resolve (Request : access Query; Ifnet : access Net.Interfaces.Ifnet_Type'Class; Name : in String; Status : out Error_Code; Timeout : in Duration := 10.0) with Pre => Name'Length < DNS_NAME_MAX_LENGTH, Post => Request.Get_Status /= NOQUERY; -- Save the answer received from the DNS server. This operation is called for each answer -- found in the DNS response packet. The Index is incremented at each answer. For example -- a DNS server can return a CNAME_RR answer followed by an A_RR: the operation is called -- two times. -- -- This operation can be overriden to implement specific actions when an answer is received. procedure Answer (Request : in out Query; Status : in Status_Type; Response : in Response_Type; Index : in Natural); overriding procedure Receive (Request : in out Query; From : in Net.Sockets.Sockaddr_In; Packet : in out Net.Buffers.Buffer_Type); private protected type Request is procedure Set_Result (Addr : in Net.Ip_Addr; Time : in Net.Uint32); procedure Set_Status (State : in Status_Type); function Get_IP return Net.Ip_Addr; function Get_Status return Status_Type; function Get_TTL return Net.Uint32; private Status : Status_Type := NOQUERY; Ip : Net.Ip_Addr := (others => 0); Ttl : Net.Uint32; end Request; type Query is new Net.Sockets.Udp.Socket with record Name : String (1 .. DNS_NAME_MAX_LENGTH); Name_Len : Natural := 0; Deadline : Ada.Real_Time.Time; Xid : Net.Uint16; Result : Request; end record; end Net.DNS;
mirror/ncurses
Ada
3,179
adb
------------------------------------------------------------------------------ -- -- -- GNAT ncurses Binding Samples -- -- -- -- ncurses -- -- -- -- B O D Y -- -- -- ------------------------------------------------------------------------------ -- Copyright 2020 Thomas E. Dickey -- -- Copyright 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.2 $ -- Binding Version 01.00 ------------------------------------------------------------------------------ with ncurses2.m; use ncurses2.m; with GNAT.OS_Lib; use GNAT.OS_Lib; procedure ncurses is begin OS_Exit (main); end ncurses;
AdaCore/libadalang
Ada
86
adb
procedure Foo.Subp is begin pragma Test (I); pragma Test (Foo.I); end Foo.Subp;
johnperry-math/hac
Ada
14,683
adb
with HAC_Pack; with Ada.Calendar, Ada.Characters.Handling, Ada.Directories, Ada.Environment_Variables, Ada.Numerics.Float_Random, Ada.Strings; package body HAC_Sys.PCode.Interpreter.Operators is procedure Do_Unary_Operator (ND : in out Interpreter_Data) is Curr_TCB_Top : Integer renames ND.TCB (ND.CurTask).T; X : General_Register renames ND.S (Curr_TCB_Top); H1 : Defs.Index; use type Defs.HAC_Float, Defs.HAC_Integer; I_to_F : Defs.HAC_Float; begin case Unary_Operator_Opcode (ND.IR.F) is when k_Dereference => X := ND.S (Defs.Index (X.I)); -- "[T] := ([T].I).all" when k_NOT_Boolean => X.I := Boolean'Pos (not Boolean'Val (X.I)); when k_Unary_MINUS_Integer => X.I := -X.I; when k_Unary_MINUS_Float => X.R := -X.R; when k_Integer_to_Float => H1 := Curr_TCB_Top - Defs.Index (ND.IR.Y); I_to_F := Defs.HAC_Float (ND.S (H1).I); ND.S (H1) := GR_Real (I_to_F); end case; end Do_Unary_Operator; procedure Do_Binary_Operator (ND : in out Interpreter_Data) is Curr_TCB_Top : Integer renames ND.TCB (ND.CurTask).T; X : General_Register renames ND.S (Curr_TCB_Top - 1); -- X = [T-1] Y : General_Register renames ND.S (Curr_TCB_Top); -- Y = [T] use Defs.VStrings_Pkg, Defs.REF; use type Defs.HAC_Float, Defs.HAC_Integer; begin -- We do [T] <- ([T-1] operator [T]) and pop later. case Binary_Operator_Opcode (ND.IR.F) is when k_EQL_Float => X.I := Boolean'Pos (X.R = Y.R); when k_NEQ_Float => X.I := Boolean'Pos (X.R /= Y.R); when k_LSS_Float => X.I := Boolean'Pos (X.R < Y.R); when k_LEQ_Float => X.I := Boolean'Pos (X.R <= Y.R); when k_GTR_Float => X.I := Boolean'Pos (X.R > Y.R); when k_GEQ_Float => X.I := Boolean'Pos (X.R >= Y.R); -- when k_EQL_Integer => X.I := Boolean'Pos (X.I = Y.I); when k_NEQ_Integer => X.I := Boolean'Pos (X.I /= Y.I); when k_LSS_Integer => X.I := Boolean'Pos (X.I < Y.I); when k_LEQ_Integer => X.I := Boolean'Pos (X.I <= Y.I); when k_GTR_Integer => X.I := Boolean'Pos (X.I > Y.I); when k_GEQ_Integer => X.I := Boolean'Pos (X.I >= Y.I); -- when k_EQL_VString => X.I := Boolean'Pos (X.V = Y.V); when k_NEQ_VString => X.I := Boolean'Pos (X.V /= Y.V); when k_LSS_VString => X.I := Boolean'Pos (X.V < Y.V); when k_LEQ_VString => X.I := Boolean'Pos (X.V <= Y.V); when k_GTR_VString => X.I := Boolean'Pos (X.V > Y.V); when k_GEQ_VString => X.I := Boolean'Pos (X.V >= Y.V); -- when k_AND_Boolean => X.I := Boolean'Pos (Boolean'Val (X.I) and Boolean'Val (Y.I)); when k_OR_Boolean => X.I := Boolean'Pos (Boolean'Val (X.I) or Boolean'Val (Y.I)); when k_XOR_Boolean => X.I := Boolean'Pos (Boolean'Val (X.I) xor Boolean'Val (Y.I)); -- when k_ADD_Integer => X.I := X.I + Y.I; when k_SUBTRACT_Integer => X.I := X.I - Y.I; when k_MULT_Integer => X.I := X.I * Y.I; when k_DIV_Integer => if Y.I = 0 then raise VM_Division_by_0; else X.I := X.I / Y.I; end if; when k_MOD_Integer => if Y.I = 0 then raise VM_Division_by_0; else X.I := X.I mod Y.I; end if; when k_Power_Integer => X.I := X.I ** Natural (Y.I); -- when k_ADD_Float => X.R := X.R + Y.R; when k_SUBTRACT_Float => X.R := X.R - Y.R; when k_MULT_Float => X.R := X.R * Y.R; when k_DIV_Float => X.R := X.R / Y.R; when k_Power_Float => X.R := X.R ** Y.R; when k_Power_Float_Integer => X.R := X.R ** Natural (Y.I); end case; Pop (ND); end Do_Binary_Operator; procedure Do_SF_Operator (CD : Compiler_Data; ND : in out Interpreter_Data) is Curr_TCB : Task_Control_Block renames ND.TCB (ND.CurTask); Top_Item : General_Register renames ND.S (Curr_TCB.T); temp : Defs.HAC_Float; Idx, Len, From, To : Integer; C : Character; Code : constant SF_Code := SF_Code'Val (ND.IR.Y); use Defs, Defs.VStrings_Pkg, Defs.REF, Ada.Calendar, Ada.Characters.Handling, Ada.Numerics.Float_Random, Ada.Strings; use type Defs.HAC_Integer; begin case Code is when SF_Abs_Int => Top_Item.I := abs (Top_Item.I); when SF_Abs_Float => Top_Item.R := abs (Top_Item.R); when SF_T_Val => -- S'Val : RM 3.5.5 (5) if (Top_Item.I < Defs.OrdMinChar) or (Top_Item.I > Defs.OrdMaxChar) -- !! Character range then raise VM_Out_of_Range; end if; when SF_T_Pos => -- S'Pos : RM 3.5.5 (2) null; when SF_T_Succ => Top_Item.I := Top_Item.I + 1; -- S'Succ : RM 3.5 (22) when SF_T_Pred => Top_Item.I := Top_Item.I - 1; -- S'Pred : RM 3.5 (25) when SF_Round_Float_to_Int => Top_Item.I := HAC_Integer (Top_Item.R); when SF_Trunc_Float_to_Int => Top_Item.I := HAC_Integer (Defs.HAC_Float'Floor (Top_Item.R)); when SF_Float_to_Duration => Top_Item := GR_Duration (Duration (Top_Item.R)); when SF_Duration_to_Float => Top_Item := GR_Real (Defs.HAC_Float (Top_Item.Dur)); when SF_Int_to_Duration => Top_Item := GR_Duration (Duration (Top_Item.I)); when SF_Duration_to_Int => Top_Item.I := HAC_Integer (Top_Item.Dur); when SF_Sin => Top_Item.R := Sin (Top_Item.R); when SF_Cos => Top_Item.R := Cos (Top_Item.R); when SF_Exp => Top_Item.R := Exp (Top_Item.R); when SF_Log => Top_Item.R := Log (Top_Item.R); when SF_Sqrt => Top_Item.R := Sqrt (Top_Item.R); when SF_Arctan => Top_Item.R := Arctan (Top_Item.R); when SF_Random_Int => temp := Defs.HAC_Float (Random (ND.Gen)) * Defs.HAC_Float ((Top_Item.I + 1)); Top_Item.I := HAC_Integer (Defs.HAC_Float'Floor (temp)); when SF_String_to_VString => -- Unary "+", equivalent to the call To_VString (S) Idx := Integer (ND.S (Curr_TCB.T).I); -- Index in the stack Len := Integer (ND.IR.X); -- Length of string ND.S (Curr_TCB.T) := GR_VString (Get_String_from_Stack (ND, Idx, Len)); when SF_Literal_to_VString => -- Unary "+", equivalent to the call To_VString ("abc") Pop (ND); Len := Integer (ND.S (Curr_TCB.T).I); -- Length of string Idx := Integer (ND.S (Curr_TCB.T + 1).I); -- Index to string table ND.S (Curr_TCB.T) := GR_VString (CD.Strings_Constants_Table (Idx .. Idx + Len - 1)); when SF_Char_to_VString => -- We create a 1-character temporary String: (1 => Character'Val (...)) and -- convert it to a VString ND.S (Curr_TCB.T) := GR_VString (To_VString ((1 => Character'Val (ND.S (Curr_TCB.T).I)))); when SF_Two_VStrings_Concat => Pop (ND); -- [T] := [T] & [T+1] : ND.S (Curr_TCB.T).V := ND.S (Curr_TCB.T).V & ND.S (Curr_TCB.T + 1).V; when SF_VString_Char_Concat => Pop (ND); ND.S (Curr_TCB.T).V := ND.S (Curr_TCB.T).V & Character'Val (ND.S (Curr_TCB.T + 1).I); when SF_Char_VString_Concat => Pop (ND); ND.S (Curr_TCB.T) := GR_VString (Character'Val (ND.S (Curr_TCB.T).I) & ND.S (Curr_TCB.T + 1).V); when SF_LStr_VString_Concat => -- Literal: 2 items, VString: 1 item. Total, 3 items folded into 1 item. Pop (ND, 2); Len := Integer (ND.S (Curr_TCB.T).I); -- Length of string Idx := Integer (ND.S (Curr_TCB.T + 1).I); -- Index to string table ND.S (Curr_TCB.T) := GR_VString (CD.Strings_Constants_Table (Idx .. Idx + Len - 1) & ND.S (Curr_TCB.T + 2).V); when SF_VString_Int_Concat => Pop (ND); ND.S (Curr_TCB.T).V := ND.S (Curr_TCB.T).V & To_VString (HAC_Image (ND.S (Curr_TCB.T + 1).I)); when SF_Int_VString_Concat => Pop (ND); ND.S (Curr_TCB.T) := GR_VString ((HAC_Image (ND.S (Curr_TCB.T).I)) & ND.S (Curr_TCB.T + 1).V); when SF_VString_Float_Concat => Pop (ND); ND.S (Curr_TCB.T).V := ND.S (Curr_TCB.T).V & To_VString (HAC_Image (ND.S (Curr_TCB.T + 1).R)); when SF_Float_VString_Concat => Pop (ND); ND.S (Curr_TCB.T) := GR_VString (To_VString (HAC_Image (ND.S (Curr_TCB.T).R)) & ND.S (Curr_TCB.T + 1).V); when SF_Element => Pop (ND); -- [T] := Element ([T], [T+1]) : C := Element (ND.S (Curr_TCB.T).V, Integer (ND.S (Curr_TCB.T + 1).I)); ND.S (Curr_TCB.T).I := Character'Pos (C); when SF_Length => -- [T] := Length ([T]) : Len := Length (Top_Item.V); -- !! Here: bound checking !! Top_Item.I := HAC_Integer (Len); when SF_Slice => Pop (ND, 2); From := Integer (ND.S (Curr_TCB.T + 1).I); To := Integer (ND.S (Curr_TCB.T + 2).I); -- !! Here: bound checking !! -- [T] := Slice ([T], [T+1], [T+2]) : ND.S (Curr_TCB.T).V := To_VString (Slice (ND.S (Curr_TCB.T).V, From, To)); when SF_To_Lower_Char => Top_Item.I := Character'Pos (To_Lower (Character'Val (Top_Item.I))); when SF_To_Upper_Char => Top_Item.I := Character'Pos (To_Upper (Character'Val (Top_Item.I))); when SF_To_Lower_VStr => Top_Item.V := To_VString (To_Lower (Defs.To_String (Top_Item.V))); when SF_To_Upper_VStr => Top_Item.V := To_VString (To_Upper (Defs.To_String (Top_Item.V))); when SF_Index => Pop (ND); -- [T] := Index ([T], [T+1]) : ND.S (Curr_TCB.T).I := HAC_Integer ( VStrings_Pkg.Index (ND.S (Curr_TCB.T).V, Defs.To_String (ND.S (Curr_TCB.T + 1).V)) ); when SF_Head => Pop (ND); -- [T] := Head ([T], [T+1]) : ND.S (Curr_TCB.T).V := VStrings_Pkg.Head (ND.S (Curr_TCB.T).V, Natural (ND.S (Curr_TCB.T + 1).I)); when SF_Tail => Pop (ND); -- [T] := Tail ([T], [T+1]) : ND.S (Curr_TCB.T).V := VStrings_Pkg.Tail (ND.S (Curr_TCB.T).V, Natural (ND.S (Curr_TCB.T + 1).I)); when SF_Starts_With => Pop (ND); -- [T] := Starts_With ([T], [T+1]) : ND.S (Curr_TCB.T).I := Boolean'Pos (HAC_Pack.Starts_With (ND.S (Curr_TCB.T).V, ND.S (Curr_TCB.T + 1).V)); when SF_Ends_With => Pop (ND); -- [T] := Ends_With ([T], [T+1]) : ND.S (Curr_TCB.T).I := Boolean'Pos (HAC_Pack.Ends_With (ND.S (Curr_TCB.T).V, ND.S (Curr_TCB.T + 1).V)); when SF_Year => ND.S (Curr_TCB.T).I := HAC_Integer (Ada.Calendar.Year (ND.S (Curr_TCB.T).Tim)); when SF_Month => ND.S (Curr_TCB.T).I := HAC_Integer (Ada.Calendar.Month (ND.S (Curr_TCB.T).Tim)); when SF_Day => ND.S (Curr_TCB.T).I := HAC_Integer (Ada.Calendar.Day (ND.S (Curr_TCB.T).Tim)); when SF_Seconds => ND.S (Curr_TCB.T) := GR_Duration (Ada.Calendar.Seconds (ND.S (Curr_TCB.T).Tim)); when SF_Int_Times_Char => Pop (ND); if ND.S (Curr_TCB.T).I < 0 then raise VM_Out_of_Range; end if; -- [T] := [T] * [T+1] : ND.S (Curr_TCB.T) := GR_VString (Natural (ND.S (Curr_TCB.T).I) * Character'Val (ND.S (Curr_TCB.T + 1).I)); when SF_Int_Times_VStr => Pop (ND); if ND.S (Curr_TCB.T).I < 0 then raise VM_Out_of_Range; end if; -- [T] := [T] * [T+1] : ND.S (Curr_TCB.T) := GR_VString (Natural (ND.S (Curr_TCB.T).I) * ND.S (Curr_TCB.T + 1).V); when SF_Trim_Left => Top_Item.V := Trim (Top_Item.V, Left); when SF_Trim_Right => Top_Item.V := Trim (Top_Item.V, Right); when SF_Trim_Both => Top_Item.V := Trim (Top_Item.V, Both); -- when SF_Time_Subtract => Pop (ND); ND.S (Curr_TCB.T) := GR_Duration (ND.S (Curr_TCB.T).Tim - ND.S (Curr_TCB.T + 1).Tim); when SF_Duration_Subtract => Pop (ND); ND.S (Curr_TCB.T).Dur := ND.S (Curr_TCB.T).Dur - ND.S (Curr_TCB.T + 1).Dur; when SF_Duration_Add => Pop (ND); ND.S (Curr_TCB.T).Dur := ND.S (Curr_TCB.T).Dur + ND.S (Curr_TCB.T + 1).Dur; -- when SF_Image_Ints => Top_Item := GR_VString (HAC_Image (Top_Item.I)); when SF_Image_Floats => Top_Item := GR_VString (HAC_Image (Top_Item.R)); when SF_Image_Attribute_Floats => Top_Item := GR_VString (HAC_Float'Image (Top_Item.R)); when SF_Image_Times => Top_Item := GR_VString (HAC_Image (Top_Item.Tim)); when SF_Image_Durations => Top_Item := GR_VString (Duration'Image (Top_Item.Dur)); -- when SF_Integer_Value => Top_Item.I := HAC_Integer'Value (Defs.To_String (Top_Item.V)); when SF_Float_Value => Top_Item := GR_Real (HAC_Float'Value (Defs.To_String (Top_Item.V))); when SF_Get_Env => declare use Ada.Environment_Variables; Name : constant String := Defs.To_String (Top_Item.V); begin if Exists (Name) then Top_Item.V := To_VString (Value (Name)); else Top_Item.V := Null_VString; end if; end; when SF_Exists => Top_Item.I := Boolean'Pos (Ada.Directories.Exists (Defs.To_String (Top_Item.V))); when SF_Niladic => -- NILADIC functions need to push a new item (their own result). Push (ND); case SF_Niladic (Code) is when SF_Clock => ND.S (Curr_TCB.T) := GR_Time (Ada.Calendar.Clock); when SF_Random_Float => ND.S (Curr_TCB.T).R := Defs.HAC_Float (Random (ND.Gen)); when SF_Argument_Count | SF_Directory_Separator | SF_Current_Directory | SF_Get_Needs_Skip_Line | SF_Command_Name => -- Those functions have been already processed at an -- upper calling level by Do_Standard_Function. null; end case; when SF_EOF | SF_EOLN | SF_Argument => -- Those functions have been already processed at an -- upper calling level by Do_Standard_Function. null; end case; end Do_SF_Operator; end HAC_Sys.PCode.Interpreter.Operators;
damaki/libkeccak
Ada
3,072
ads
------------------------------------------------------------------------------- -- Copyright (c) 2019, Daniel King -- All rights reserved. -- -- Redistribution and use in source and binary forms, with or without -- modification, are permitted provided that the following conditions are met: -- * Redistributions of source code must retain the above copyright -- notice, this list of conditions and the following disclaimer. -- * Redistributions in binary form must reproduce the above copyright -- notice, this list of conditions and the following disclaimer in the -- documentation and/or other materials provided with the distribution. -- * The name of the copyright holder may not be used to endorse or promote -- Products derived from this software without specific prior written -- permission. -- -- THIS SOFTWARE IS PROVIDED BY THE COPYRIGHT HOLDERS AND CONTRIBUTORS "AS IS" -- AND ANY EXPRESS OR IMPLIED WARRANTIES, INCLUDING, BUT NOT LIMITED TO, THE -- IMPLIED WARRANTIES OF MERCHANTABILITY AND FITNESS FOR A PARTICULAR PURPOSE -- ARE DISCLAIMED. IN NO EVENT SHALL THE COPYRIGHT HOLDER BE LIABLE FOR ANY -- DIRECT, INDIRECT, INCIDENTAL, SPECIAL, EXEMPLARY, OR CONSEQUENTIAL DAMAGES -- (INCLUDING, BUT NOT LIMITED TO, PROCUREMENT OF SUBSTITUTE GOODS OR SERVICES; -- LOSS OF USE, DATA, OR PROFITS; OR BUSINESS INTERRUPTION) HOWEVER CAUSED AND -- ON ANY THEORY OF LIABILITY, WHETHER IN CONTRACT, STRICT LIABILITY, OR TORT -- (INCLUDING NEGLIGENCE OR OTHERWISE) ARISING IN ANY WAY OUT OF THE USE OF -- THIS SOFTWARE, EVEN IF ADVISED OF THE POSSIBILITY OF SUCH DAMAGE. ------------------------------------------------------------------------------- with Keccak.Generic_Duplex; with Keccak.Generic_Sponge; with Keccak.Padding; pragma Elaborate_All (Keccak.Generic_Duplex); pragma Elaborate_All (Keccak.Generic_Sponge); -- @summary -- Instantiation of Keccak-p[200,12], with a Sponge and Duplex built on top of it. package Keccak.Keccak_200.Rounds_12 with SPARK_Mode => On is procedure Permute is new KeccakF_200_Permutation.Permute (Num_Rounds => 12); package Sponge is new Keccak.Generic_Sponge (State_Size_Bits => KeccakF_200.State_Size_Bits, State_Type => State, Init_State => KeccakF_200.Init, Permute => Permute, XOR_Bits_Into_State => KeccakF_200_Lanes.XOR_Bits_Into_State, Extract_Data => KeccakF_200_Lanes.Extract_Bytes, Pad => Keccak.Padding.Pad101_Multi_Blocks); package Duplex is new Keccak.Generic_Duplex (State_Size_Bits => KeccakF_200.State_Size_Bits, State_Type => State, Init_State => KeccakF_200.Init, Permute => Permute, XOR_Bits_Into_State => KeccakF_200_Lanes.XOR_Bits_Into_State, Extract_Bits => KeccakF_200_Lanes.Extract_Bits, Pad => Keccak.Padding.Pad101_Single_Block, Min_Padding_Bits => Keccak.Padding.Pad101_Min_Bits); end Keccak.Keccak_200.Rounds_12;
Tim-Tom/project-euler
Ada
1,383
ads
package Problem_55 is -- If we take 47, reverse and add, 47 + 74 = 121, which is palindromic. -- -- Not all numbers produce palindromes so quickly. For example, -- 349 + 943 = 1292, -- 1292 + 2921 = 4213 -- 4213 + 3124 = 7337 -- That is, 349 took three iterations to arrive at a palindrome. -- -- Although no one has proved it yet, it is thought that some numbers, -- like 196, never produce a palindrome. A number that never forms a -- palindrome through the reverse and add process is called a Lychrel number. -- Due to the theoretical nature of these numbers, and for the purpose of -- this problem, we shall assume that a number is Lychrel until proven -- otherwise. In addition you are given that for every number below -- ten-thousand, it will either (i) become a palindrome in less than fifty -- iterations, or, (ii) no one, with all the computing power that exists, -- has managed so far to map it to a palindrome. In fact, 10677 is the first -- number to be shown to require over fifty iterations before producing a -- palindrome: 4668731596684224866951378664 (53 iterations, 28-digits). -- -- Surprisingly, there are palindromic numbers that are themselves Lychrel -- numbers; the first example is 4994. -- -- How many Lychrel numbers are there below ten-thousand? procedure Solve; end Problem_55;
optikos/oasis
Ada
3,151
ads
-- Copyright (c) 2019 Maxim Reznik <[email protected]> -- -- SPDX-License-Identifier: MIT -- License-Filename: LICENSE ------------------------------------------------------------- with Program.Lexical_Elements; with Program.Elements.String_Literals; with Program.Element_Visitors; package Program.Nodes.String_Literals is pragma Preelaborate; type String_Literal is new Program.Nodes.Node and Program.Elements.String_Literals.String_Literal and Program.Elements.String_Literals.String_Literal_Text with private; function Create (String_Literal_Token : not null Program.Lexical_Elements .Lexical_Element_Access) return String_Literal; type Implicit_String_Literal is new Program.Nodes.Node and Program.Elements.String_Literals.String_Literal with private; function Create (Is_Part_Of_Implicit : Boolean := False; Is_Part_Of_Inherited : Boolean := False; Is_Part_Of_Instance : Boolean := False) return Implicit_String_Literal with Pre => Is_Part_Of_Implicit or Is_Part_Of_Inherited or Is_Part_Of_Instance; private type Base_String_Literal is abstract new Program.Nodes.Node and Program.Elements.String_Literals.String_Literal with null record; procedure Initialize (Self : aliased in out Base_String_Literal'Class); overriding procedure Visit (Self : not null access Base_String_Literal; Visitor : in out Program.Element_Visitors.Element_Visitor'Class); overriding function Is_String_Literal_Element (Self : Base_String_Literal) return Boolean; overriding function Is_Expression_Element (Self : Base_String_Literal) return Boolean; type String_Literal is new Base_String_Literal and Program.Elements.String_Literals.String_Literal_Text with record String_Literal_Token : not null Program.Lexical_Elements .Lexical_Element_Access; end record; overriding function To_String_Literal_Text (Self : aliased in out String_Literal) return Program.Elements.String_Literals.String_Literal_Text_Access; overriding function String_Literal_Token (Self : String_Literal) return not null Program.Lexical_Elements.Lexical_Element_Access; overriding function Image (Self : String_Literal) return Text; type Implicit_String_Literal is new Base_String_Literal with record Is_Part_Of_Implicit : Boolean; Is_Part_Of_Inherited : Boolean; Is_Part_Of_Instance : Boolean; end record; overriding function To_String_Literal_Text (Self : aliased in out Implicit_String_Literal) return Program.Elements.String_Literals.String_Literal_Text_Access; overriding function Is_Part_Of_Implicit (Self : Implicit_String_Literal) return Boolean; overriding function Is_Part_Of_Inherited (Self : Implicit_String_Literal) return Boolean; overriding function Is_Part_Of_Instance (Self : Implicit_String_Literal) return Boolean; overriding function Image (Self : Implicit_String_Literal) return Text; end Program.Nodes.String_Literals;
reznikmm/matreshka
Ada
4,027
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.Chart_Spline_Order_Attributes; package Matreshka.ODF_Chart.Spline_Order_Attributes is type Chart_Spline_Order_Attribute_Node is new Matreshka.ODF_Chart.Abstract_Chart_Attribute_Node and ODF.DOM.Chart_Spline_Order_Attributes.ODF_Chart_Spline_Order_Attribute with null record; overriding function Create (Parameters : not null access Matreshka.DOM_Attributes.Attribute_L2_Parameters) return Chart_Spline_Order_Attribute_Node; overriding function Get_Local_Name (Self : not null access constant Chart_Spline_Order_Attribute_Node) return League.Strings.Universal_String; end Matreshka.ODF_Chart.Spline_Order_Attributes;
AdaCore/Ada_Drivers_Library
Ada
3,573
adb
------------------------------------------------------------------------------ -- -- -- Copyright (C) 2017, AdaCore -- -- -- -- Redistribution and use in source and binary forms, with or without -- -- modification, are permitted provided that the following conditions are -- -- met: -- -- 1. Redistributions of source code must retain the above copyright -- -- notice, this list of conditions and the following disclaimer. -- -- 2. Redistributions in binary form must reproduce the above copyright -- -- notice, this list of conditions and the following disclaimer in -- -- the documentation and/or other materials provided with the -- -- distribution. -- -- 3. Neither the name of the copyright holder nor the names of its -- -- contributors may be used to endorse or promote products derived -- -- from this software without specific prior written permission. -- -- -- -- THIS SOFTWARE IS PROVIDED BY THE COPYRIGHT HOLDERS AND CONTRIBUTORS -- -- "AS IS" AND ANY EXPRESS OR IMPLIED WARRANTIES, INCLUDING, BUT NOT -- -- LIMITED TO, THE IMPLIED WARRANTIES OF MERCHANTABILITY AND FITNESS FOR -- -- A PARTICULAR PURPOSE ARE DISCLAIMED. IN NO EVENT SHALL THE COPYRIGHT -- -- HOLDER OR CONTRIBUTORS BE LIABLE FOR ANY DIRECT, INDIRECT, INCIDENTAL, -- -- SPECIAL, EXEMPLARY, OR CONSEQUENTIAL DAMAGES (INCLUDING, BUT NOT -- -- LIMITED TO, PROCUREMENT OF SUBSTITUTE GOODS OR SERVICES; LOSS OF USE, -- -- DATA, OR PROFITS; OR BUSINESS INTERRUPTION) HOWEVER CAUSED AND ON ANY -- -- THEORY OF LIABILITY, WHETHER IN CONTRACT, STRICT LIABILITY, OR TORT -- -- (INCLUDING NEGLIGENCE OR OTHERWISE) ARISING IN ANY WAY OUT OF THE USE -- -- OF THIS SOFTWARE, EVEN IF ADVISED OF THE POSSIBILITY OF SUCH DAMAGE. -- -- -- ------------------------------------------------------------------------------ with File_IO; use File_IO; package body Command_Line.Filesystem.Touch is ------------- -- Execute -- ------------- overriding procedure Execute (This : in out Touch_Cmd; Args : in out Arguments'Class; Put : Put_Procedure; Put_Line : Put_Line_Procedure) is pragma Unreferenced (This, Put); begin loop declare Arg : constant String := Args.Next; Status : Status_Code; begin if Arg'Length = 0 then return; end if; Status := File_IO.Create_File (Arg); if Status /= OK then Put_Line ("Cannot create file '" & Arg & "': " & Status'Img); end if; end; end loop; end Execute; ---------- -- Help -- ---------- overriding procedure Help (This : in out Touch_Cmd; Put : Put_Procedure; Put_Line : Put_Line_Procedure) is pragma Unreferenced (Put, This); begin Put_Line ("Usage: touch [FILE]..."); Put_Line ("Create empty file(s)."); end Help; end Command_Line.Filesystem.Touch;
reznikmm/matreshka
Ada
4,147
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_Source_Cell_Range_Addresses_Attributes; package Matreshka.ODF_Table.Source_Cell_Range_Addresses_Attributes is type Table_Source_Cell_Range_Addresses_Attribute_Node is new Matreshka.ODF_Table.Abstract_Table_Attribute_Node and ODF.DOM.Table_Source_Cell_Range_Addresses_Attributes.ODF_Table_Source_Cell_Range_Addresses_Attribute with null record; overriding function Create (Parameters : not null access Matreshka.DOM_Attributes.Attribute_L2_Parameters) return Table_Source_Cell_Range_Addresses_Attribute_Node; overriding function Get_Local_Name (Self : not null access constant Table_Source_Cell_Range_Addresses_Attribute_Node) return League.Strings.Universal_String; end Matreshka.ODF_Table.Source_Cell_Range_Addresses_Attributes;
tum-ei-rcs/StratoX
Ada
13,859
ads
-- Institution: Technische Universitaet Muenchen -- Department: Realtime Computer Systems (RCS) -- Project: StratoX -- Module: Units -- -- Authors: Emanuel Regnath ([email protected]) -- -- Description: Checked dimension system for physical calculations -- Based on package System.Dim.MKS -- -- ToDo: -- [ ] Define all required types with Ada.Real_Time; use Ada.Real_Time; with Ada.Numerics; with Types; pragma Elaborate_All (Types); -- TODO: is this required? package Units with Spark_Mode is --------------------- -- The unit system --------------------- type Base_Unit_Type is new Float; type Unit_Type is new Base_Unit_Type with -- As tagged Type? -> Generics with Unit_Type'Class Dimension_System => ((Unit_Name => Meter, Unit_Symbol => 'm', Dim_Symbol => 'L'), (Unit_Name => Kilogram, Unit_Symbol => "kg", Dim_Symbol => 'M'), (Unit_Name => Second, Unit_Symbol => 's', Dim_Symbol => 'T'), (Unit_Name => Ampere, Unit_Symbol => 'A', Dim_Symbol => 'I'), (Unit_Name => Kelvin, Unit_Symbol => 'K', Dim_Symbol => "Theta"), (Unit_Name => Radian, Unit_Symbol => "Rad", Dim_Symbol => "A")), Default_Value => 0.0; -- required for matrices type Unit_Array is array (Natural range <>) of Unit_Type; -- Base Units subtype Length_Type is Unit_Type with Dimension => (Symbol => 'm', Meter => 1, others => 0); subtype Mass_Type is Unit_Type with Dimension => (Symbol => "kg", Kilogram => 1, others => 0); subtype Time_Type is Unit_Type with Dimension => (Symbol => 's', Second => 1, others => 0); subtype Current_Type is Unit_Type with Dimension => (Symbol => 'A', Ampere => 1, others => 0); subtype Temperature_Type is Unit_Type with Dimension => (Symbol => 'K', Kelvin => 1, others => 0); subtype Angle_Type is Unit_Type with Dimension => (Symbol => "Rad", Radian => 1, others => 0); -- Derived Units subtype Length_Angle_Ratio_Type is Unit_Type with Dimension => (Meter => 1, Radian => -1, others => 0); -- mechanical subtype Frequency_Type is Unit_Type with Dimension => (Symbol => "Hz", Second => -1, others => 0); subtype Force_Type is Unit_Type with Dimension => (Symbol => "N", Kilogram => 1, Meter => 1, Second => -2, others => 0); subtype Energy_Type is Unit_Type with Dimension => (Symbol => "J", Kilogram => 1, Meter => 2, Second => -2, others => 0); subtype Power_Type is Unit_Type with Dimension => (Symbol => "W", Kilogram => 1, Meter => 2, Second => -3, others => 0); subtype Pressure_Type is Unit_Type with Dimension => (Symbol => "Pa", Kilogram => 1, Meter => -1, Second => -2, others => 0); -- electromagnetic subtype Voltage_Type is Unit_Type with Dimension => (Symbol => 'V', Meter => 2, Kilogram => 1, Second => -3, Ampere => -1, others => 0); subtype Charge_Type is Unit_Type with Dimension => (Symbol => 'C', Second => 1, Ampere => 1, others => 0); subtype Capacity_Type is Unit_Type with Dimension => (Symbol => 'F', Kilogram => -1, Meter => -2, Second => 4, Ampere => 2, others => 0); subtype Resistivity_Type is Unit_Type with Dimension => (Symbol => "Ω", Kilogram => 1, Meter => 2, Second => -2, Ampere => -3, others => 0); subtype Inductivity_Type is Unit_Type with Dimension => (Symbol => 'H', Kilogram => 1, Meter => 2, Second => -2, Ampere => -2, others => 0); subtype Electric_Field_Type is Unit_Type with Dimension => (Meter => 1, Kilogram => 1, Second => -3, Ampere => -1, others => 0); subtype Magnetic_Flux_Type is Unit_Type with Dimension => (Symbol => "Wb", Kilogram => 1, Meter => 2, Second => -2, Ampere => -1, others => 0); subtype Magnetic_Flux_Density_Type is Unit_Type with Dimension => (Symbol => 'T', Kilogram => 1, Second => -2, Ampere => -1, others => 0); -- further important dimensions subtype Area_Type is Unit_Type with Dimension => (Symbol => "m^2", Meter => 2, others => 0); subtype Volume_Type is Unit_Type with Dimension => (Symbol => "m^3", Meter => 3, others => 0); subtype Linear_Velocity_Type is Unit_Type with Dimension => (Meter => 1, Second => -1, others => 0); subtype Angular_Velocity_Type is Unit_Type with Dimension => (Radian => 1, Second => -1, others => 0); subtype Linear_Acceleration_Type is Unit_Type with Dimension => (Meter => 1, Second => -2, others => 0); subtype Angular_Acceleration_Type is Unit_Type with Dimension => (Radian => 1, Second => -2, others => 0); -------------------------- -- Prefixes for units -------------------------- subtype Prefix_Type is Unit_Type; --type Prefix_Type is digits 2 range 1.0e-24 .. 1.0e+24; Yocto : constant Prefix_Type := Prefix_Type (1.0e-24); Zepto : constant Prefix_Type := Prefix_Type (1.0e-21); Atto : constant Prefix_Type := Prefix_Type (1.0e-18); Femto : constant Prefix_Type := Prefix_Type (1.0e-15); Pico : constant Prefix_Type := Prefix_Type (1.0e-12); Nano : constant Prefix_Type := Prefix_Type (1.0e-9); Micro : constant Prefix_Type := Prefix_Type (1.0e-6); Milli : constant Prefix_Type := Prefix_Type (1.0e-3); Centi : constant Prefix_Type := Prefix_Type (1.0e-2); Deci : constant Prefix_Type := Prefix_Type (1.0e-1); Deca : constant Prefix_Type := Prefix_Type (1.0e+1); Hecto : constant Prefix_Type := Prefix_Type (1.0e+2); Kilo : constant Prefix_Type := Prefix_Type (1.0e+3); Mega : constant Prefix_Type := Prefix_Type (1.0e+6); Giga : constant Prefix_Type := Prefix_Type (1.0e+9); Tera : constant Prefix_Type := Prefix_Type (1.0e+12); Peta : constant Prefix_Type := Prefix_Type (1.0e+15); Exa : constant Prefix_Type := Prefix_Type (1.0e+18); Zetta : constant Prefix_Type := Prefix_Type (1.0e+21); Yotta : constant Prefix_Type := Prefix_Type (1.0e+24); -------------------------- -- The units -------------------------- -- Base units Meter : constant Length_Type := Length_Type (1.0); Kilogram : constant Mass_Type := Mass_Type (1.0); Gram : constant Mass_Type := Mass_Type (1.0e-3); Second : constant Time_Type := Time_Type (1.0); Ampere : constant Current_Type := Current_Type (1.0); Kelvin : constant Temperature_Type := Temperature_Type (1.0); -- Angular Units Radian : constant Angle_Type := Angle_Type (1.0); Degree : constant Angle_Type := Angle_Type (2.0 * Ada.Numerics.Pi / 360.0); Evolution : constant Angle_Type := Angle_Type (2.0 * Ada.Numerics.Pi); -- Derived Units Newton : constant Force_Type := Force_Type (1.0); Joule : constant Energy_Type := Energy_Type (1.0); Watt : constant Power_Type := Power_Type (1.0); Ohm : constant Resistivity_Type := Resistivity_Type (1.0); Pascal : constant Pressure_Type := Pressure_Type (1.0); Volt : constant Voltage_Type := Voltage_Type (1.0); Coulomb : constant Charge_Type := Charge_Type(1.0); Farad : constant Capacity_Type := Capacity_Type(1.0); Weber : constant Magnetic_Flux_Type := Magnetic_Flux_Type(1.0); Tesla : constant Magnetic_Flux_Density_Type := Magnetic_Flux_Density_Type(1.0); Henry : constant Inductivity_Type := Inductivity_Type(1.0); Hertz : constant Frequency_Type := Frequency_Type (1.0); -- Non SI but metric Minute : constant Time_Type := 60.0 * Second; Hour : constant Time_Type := 60.0 * Minute; Day : constant Time_Type := 24.0 * Hour; Tonne : constant Mass_Type := 1_000.0 * Kilogram; Angstrom : constant Length_Type := 1.0 * Nano * Meter; Litre : constant Volume_Type := 1.0 * (1.0 * Deci * Meter)**3; Bar : constant Pressure_Type := 1_000.0 * Hecto * Pascal; Gauss : constant Magnetic_Flux_Density_Type := 0.1 * Tesla; -------------------------- -- Physical constants -------------------------- -- Approximate gravity on the earth's surface GRAVITY : constant Linear_Acceleration_Type := 9.81 * Meter / (Second**2); CELSIUS_0 : constant Temperature_Type := 273.15 * Kelvin; DEGREE_360 : constant Angle_Type := 360.0 * Degree; RADIAN_2PI : constant Angle_Type := 2.0 * Radian; -- Physical constants SPEED_OF_LIGHT : constant Linear_Velocity_Type := 299_792_458.0 * Meter / Second; PLANCK_CONSTANT : constant Unit_Type := 6.626_070_040 * Joule * Second; GRAVITY_CONSTANT : constant Linear_Acceleration_Type := 127_137.6 * Kilo * Meter / (Hour**2); -------------------------- -- Conversion functions -------------------------- function To_Time (rtime : Ada.Real_Time.Time) return Time_Type is (Time_Type (Float ((rtime - Ada.Real_Time.Time_First) / Ada.Real_Time.Microseconds (1)) * Float(1.0e-6))); -- converts Real_Time to Time_Type, precision is Nanosecond function To_Time (rtime : Ada.Real_Time.Time_Span) return Time_Type is (Time_Type (Float ((rtime) / Ada.Real_Time.Microseconds (1)) * Float(1.0e-6))); function To_Time_Span(time : Time_Type) return Ada.Real_Time.Time_Span is ( Ada.Real_Time.Microseconds (Types.Sat_Cast_Int (Float (time) / Float(1.0e-6)))); function To_Degree(angle : Angle_Type) return Float is (Float (angle / Degree)); ------------------------------------------------------------- -- Elementary math functions handling overflow/range checks ------------------------------------------------------------- function "+"( Left : Ada.Real_Time.Time; Right : Time_Type ) return Ada.Real_Time.Time is ( Left + Ada.Real_Time.Microseconds (Types.Sat_Cast_Int (Float (Right) / Float(1.0e-6)))); function wrap_Angle( angle : Angle_Type; min : Angle_Type; max : Angle_Type) return Angle_Type with Pre => min <= Angle_Type(0.0) and then max >= 0.0 * Radian and then angle <= Angle_Type'Last / 4.0 and then angle >= Angle_Type'First / 4.0 and then max <= Angle_Type'Last / 4.0 and then min >= Angle_Type'First / 4.0 and then max - min > 1.0e-3 * Radian, Post => Float (wrap_angle'Result) >= Float (min) and Float (wrap_angle'Result) <= Float (max); -- wrap angle between two values -- Must make no assumptions on input 'angle' here, otherwise caller might fail if it isn't SPARK. -- FIXME: the float casts in Post are a workaround for gcc function mirror_Angle( angle : Angle_Type; min : Angle_Type; max : Angle_Type) return Angle_Type with Pre => min <= 0.0 * Radian and then max >= 0.0 * Radian and then max > min and then max < Angle_Type'Last / 4.0 and then min > Angle_Type'First / 4.0, Post => Float (mirror_Angle'Result) >= Float (min) and Float (mirror_Angle'Result) <= Float (max); -- mirror angle at min/max boundaries -- FIXME: the float casts in Post are a workaround for gcc function delta_Angle(From : Angle_Type; To : Angle_Type) return Angle_Type; function integrate(x : Unit_Type'Base; dt : Time_Type) return Unit_Type'Base is ( x * dt ); -- Experimental generic integration (return value looses its units) pragma Inline_Always( integrate ); generic type T is digits <>; -- any floating point type function Saturated_Addition (left, right : T) return T with Inline, Pre => 0.0 in T'Range; -- add two Floats of same Unit type and limit to the type's bounds generic type T is digits <>; -- any floating point type function Saturate (val, min, max : T) return T with Inline; -- limit to given range generic type T is digits <>; -- any floating point type function Saturated_Subtraction (left, right : T) return T with Inline, Pre => 0.0 in T'Range; -- that is required in addition to Saturated_Addition, if the ranges are -- not symmetric generic type T is digits <>; -- any floating point type function Wrapped_Addition (left, right : T) return T with Inline, Pre => 0.0 in T'Range; -- add two Floats of same Unit type and wrap ("modulo") to the type's bounds -- Must make no assumptions on inputs otherwise caller might fail if it isn't SPARK. generic type T is digits <>; function Saturated_Cast (val : Float) return T with Inline; -- convert a float into a more specific float type, and trim to the value range function sgn( x : Unit_Type'Base ) return Unit_Type is ( if x = 0.0 then 0.0 elsif x > 0.0 then 1.0 else -1.0 ); -- get the sign as unit multiplier -- subtype Sign_Type is Float range -1.0 .. 1.0; -- function "*" (Left : Float; Right : Prefix_Type) return Unit_Type is -- ( Unit_Type( Left * Float(Right) ) ); -------------------------- -- functions on signals -------------------------- -- function Radian( degree : Float ) return Float function average( signal : Unit_Array ) return Unit_Type; ------------------ -- I/O helpers ------------------ function Image (unit : Unit_Type) return String with Post => Image'Result'Length in 1 .. 36 and Image'Result'First = 1; function AImage (unit : Angle_Type) return String with Post => AImage'Result'Length in 1 .. 36 and AImage'Result'First = 1; function RImage (unit : Angle_Type) return String with Post => RImage'Result'Length in 1 .. 40 and RImage'Result'First = 1; end Units;
G-P-S/freetype-gopro-mac
Ada
3,331
adb
---------------------------------------------------------------- -- ZLib for Ada thick binding. -- -- -- -- Copyright (C) 2002-2003 Dmitriy Anisimkov -- -- -- -- Open source license information is in the zlib.ads file. -- ---------------------------------------------------------------- -- $Id: zlib-thin.adb,v 1.1 2009/10/28 06:31:01 dnewman Exp $ package body ZLib.Thin is ZLIB_VERSION : constant Chars_Ptr := zlibVersion; Z_Stream_Size : constant Int := Z_Stream'Size / System.Storage_Unit; -------------- -- Avail_In -- -------------- function Avail_In (Strm : in Z_Stream) return UInt is begin return Strm.Avail_In; end Avail_In; --------------- -- Avail_Out -- --------------- function Avail_Out (Strm : in Z_Stream) return UInt is begin return Strm.Avail_Out; end Avail_Out; ------------------ -- Deflate_Init -- ------------------ function Deflate_Init (strm : Z_Streamp; level : Int; method : Int; windowBits : Int; memLevel : Int; strategy : Int) return Int is begin return deflateInit2 (strm, level, method, windowBits, memLevel, strategy, ZLIB_VERSION, Z_Stream_Size); end Deflate_Init; ------------------ -- Inflate_Init -- ------------------ function Inflate_Init (strm : Z_Streamp; windowBits : Int) return Int is begin return inflateInit2 (strm, windowBits, ZLIB_VERSION, Z_Stream_Size); end Inflate_Init; ------------------------ -- Last_Error_Message -- ------------------------ function Last_Error_Message (Strm : in Z_Stream) return String is use Interfaces.C.Strings; begin if Strm.msg = Null_Ptr then return ""; else return Value (Strm.msg); end if; end Last_Error_Message; ------------ -- Set_In -- ------------ procedure Set_In (Strm : in out Z_Stream; Buffer : in Voidp; Size : in UInt) is begin Strm.Next_In := Buffer; Strm.Avail_In := Size; end Set_In; ------------------ -- Set_Mem_Func -- ------------------ procedure Set_Mem_Func (Strm : in out Z_Stream; Opaque : in Voidp; Alloc : in alloc_func; Free : in free_func) is begin Strm.opaque := Opaque; Strm.zalloc := Alloc; Strm.zfree := Free; end Set_Mem_Func; ------------- -- Set_Out -- ------------- procedure Set_Out (Strm : in out Z_Stream; Buffer : in Voidp; Size : in UInt) is begin Strm.Next_Out := Buffer; Strm.Avail_Out := Size; end Set_Out; -------------- -- Total_In -- -------------- function Total_In (Strm : in Z_Stream) return ULong is begin return Strm.Total_In; end Total_In; --------------- -- Total_Out -- --------------- function Total_Out (Strm : in Z_Stream) return ULong is begin return Strm.Total_Out; end Total_Out; end ZLib.Thin;
Fabien-Chouteau/samd51-hal
Ada
7,982
ads
------------------------------------------------------------------------------ -- -- -- Copyright (C) 2019-2020, AdaCore -- -- -- -- Redistribution and use in source and binary forms, with or without -- -- modification, are permitted provided that the following conditions are -- -- met: -- -- 1. Redistributions of source code must retain the above copyright -- -- notice, this list of conditions and the following disclaimer. -- -- 2. Redistributions in binary form must reproduce the above copyright -- -- notice, this list of conditions and the following disclaimer in -- -- the documentation and/or other materials provided with the -- -- distribution. -- -- 3. Neither the name of the copyright holder nor the names of its -- -- contributors may be used to endorse or promote products derived -- -- from this software without specific prior written permission. -- -- -- -- THIS SOFTWARE IS PROVIDED BY THE COPYRIGHT HOLDERS AND CONTRIBUTORS -- -- "AS IS" AND ANY EXPRESS OR IMPLIED WARRANTIES, INCLUDING, BUT NOT -- -- LIMITED TO, THE IMPLIED WARRANTIES OF MERCHANTABILITY AND FITNESS FOR -- -- A PARTICULAR PURPOSE ARE DISCLAIMED. IN NO EVENT SHALL THE COPYRIGHT -- -- HOLDER OR CONTRIBUTORS BE LIABLE FOR ANY DIRECT, INDIRECT, INCIDENTAL, -- -- SPECIAL, EXEMPLARY, OR CONSEQUENTIAL DAMAGES (INCLUDING, BUT NOT -- -- LIMITED TO, PROCUREMENT OF SUBSTITUTE GOODS OR SERVICES; LOSS OF USE, -- -- DATA, OR PROFITS; OR BUSINESS INTERRUPTION) HOWEVER CAUSED AND ON ANY -- -- THEORY OF LIABILITY, WHETHER IN CONTRACT, STRICT LIABILITY, OR TORT -- -- (INCLUDING NEGLIGENCE OR OTHERWISE) ARISING IN ANY WAY OUT OF THE USE -- -- OF THIS SOFTWARE, EVEN IF ADVISED OF THE POSSIBILITY OF SUCH DAMAGE. -- -- -- ------------------------------------------------------------------------------ with System; with HAL; private with SAM_SVD.ADC; package SAM.ADC is type ADC_Internal is private; type ADC_Device (Periph : not null access ADC_Internal) is tagged private; type Conversion_Resolution is (Res_12bit, Res_16bit, Res_10bit, Res_8bit); type Reference_Kind is (Internal_Bandgap, Half_VDDANA, VDDANA, External_A, External_B, External_C); type Prescaler_Kind is (Pre_2, Pre_4, Pre_8, Pre_16, Pre_32, Pre_64, Pre_128, Pre_256); procedure Configure (This : in out ADC_Device; Resolution : Conversion_Resolution; Reference : Reference_Kind; Prescaler : Prescaler_Kind; Free_Running : Boolean; Differential_Mode : Boolean; Window_Monitor_Event_Out : Boolean := False; Result_Ready_Event_Out : Boolean := False; Start_Conversion_Event_Invert : Boolean := False; Flush_Event_Invert : Boolean := False; Start_Conversion_Event_Input : Boolean := False; Flush_Event_Input : Boolean := False); procedure Enable (This : in out ADC_Device); -- Enable the ADC channel procedure Disable (This : in out ADC_Device); -- Disable the ADC channel type Negative_Selection is (AIN0, AIN1, AIN2, AIN3, AIN4, AIN5, AIN6, AIN7, GND); type Positive_Selection is (AIN0, AIN1, AIN2, AIN3, AIN4, AIN5, AIN6, AIN7, AIN8, AIN9, AIN10, AIN11, AIN12, AIN13, AIN14, AIN15, AIN16, AIN17, AIN18, AIN19, AIN20, AIN21, AIN22, AIN23, SCALEDCOREVCC, SCALEDVBAT, SCALEDIOVCC, BANDGAP, PTAT, CTAT, DAC); procedure Set_Inputs (This : in out ADC_Device; Negative : Negative_Selection; Positive : Positive_Selection); -- Set the negative and positive inputs for the conversion procedure Software_Start (This : in out ADC_Device); -- Start a conversion function Conversion_Done (This : in out ADC_Device) return Boolean; -- Return True if the conversion is done function Result (This : in out ADC_Device) return HAL.UInt16; -- Return the result of a conversion -- DMA -- function Result_Address (This : ADC_Device) return System.Address; -- Return the address of the result register for DMA transfers private type ADC_Internal is new SAM_SVD.ADC.ADC_Peripheral; type ADC_Device (Periph : not null access ADC_Internal) is tagged null record; for Conversion_Resolution use (Res_12bit => 0, Res_16bit => 1, Res_10bit => 2, Res_8bit => 3); for Reference_Kind use (Internal_Bandgap => 0, Half_VDDANA => 2, VDDANA => 3, External_A => 4, External_B => 5, External_C => 6); for Negative_Selection use (AIN0 => 16#00#, AIN1 => 16#01#, AIN2 => 16#02#, AIN3 => 16#03#, AIN4 => 16#04#, AIN5 => 16#05#, AIN6 => 16#06#, AIN7 => 16#07#, GND => 16#18#); for Positive_Selection use (AIN0 => 16#00#, AIN1 => 16#01#, AIN2 => 16#02#, AIN3 => 16#03#, AIN4 => 16#04#, AIN5 => 16#05#, AIN6 => 16#06#, AIN7 => 16#07#, AIN8 => 16#08#, AIN9 => 16#09#, AIN10 => 16#0A#, AIN11 => 16#0B#, AIN12 => 16#0C#, AIN13 => 16#0D#, AIN14 => 16#0E#, AIN15 => 16#0F#, AIN16 => 16#10#, AIN17 => 16#11#, AIN18 => 16#12#, AIN19 => 16#13#, AIN20 => 16#14#, AIN21 => 16#15#, AIN22 => 16#16#, AIN23 => 16#17#, SCALEDCOREVCC => 16#18#, SCALEDVBAT => 16#19#, SCALEDIOVCC => 16#1A#, BANDGAP => 16#1B#, PTAT => 16#1C#, CTAT => 16#1D#, DAC => 16#1E#); end SAM.ADC;
reznikmm/matreshka
Ada
4,033
ads
------------------------------------------------------------------------------ -- -- -- Matreshka Project -- -- -- -- Open Document Toolkit -- -- -- -- Runtime Library Component -- -- -- ------------------------------------------------------------------------------ -- -- -- Copyright © 2014, Vadim Godunko <[email protected]> -- -- All rights reserved. -- -- -- -- Redistribution and use in source and binary forms, with or without -- -- modification, are permitted provided that the following conditions -- -- are met: -- -- -- -- * Redistributions of source code must retain the above copyright -- -- notice, this list of conditions and the following disclaimer. -- -- -- -- * Redistributions in binary form must reproduce the above copyright -- -- notice, this list of conditions and the following disclaimer in the -- -- documentation and/or other materials provided with the distribution. -- -- -- -- * Neither the name of the Vadim Godunko, IE nor the names of its -- -- contributors may be used to endorse or promote products derived from -- -- this software without specific prior written permission. -- -- -- -- THIS SOFTWARE IS PROVIDED BY THE COPYRIGHT HOLDERS AND CONTRIBUTORS -- -- "AS IS" AND ANY EXPRESS OR IMPLIED WARRANTIES, INCLUDING, BUT NOT -- -- LIMITED TO, THE IMPLIED WARRANTIES OF MERCHANTABILITY AND FITNESS FOR -- -- A PARTICULAR PURPOSE ARE DISCLAIMED. IN NO EVENT SHALL THE COPYRIGHT -- -- HOLDER OR CONTRIBUTORS BE LIABLE FOR ANY DIRECT, INDIRECT, INCIDENTAL, -- -- SPECIAL, EXEMPLARY, OR CONSEQUENTIAL DAMAGES (INCLUDING, BUT NOT LIMITED -- -- TO, PROCUREMENT OF SUBSTITUTE GOODS OR SERVICES; LOSS OF USE, DATA, OR -- -- PROFITS; OR BUSINESS INTERRUPTION) HOWEVER CAUSED AND ON ANY THEORY OF -- -- LIABILITY, WHETHER IN CONTRACT, STRICT LIABILITY, OR TORT (INCLUDING -- -- NEGLIGENCE OR OTHERWISE) ARISING IN ANY WAY OUT OF THE USE OF THIS -- -- SOFTWARE, EVEN IF ADVISED OF THE POSSIBILITY OF SUCH DAMAGE. -- -- -- ------------------------------------------------------------------------------ -- $Revision$ $Date$ ------------------------------------------------------------------------------ with ODF.DOM.Form_Focus_On_Click_Attributes; package Matreshka.ODF_Form.Focus_On_Click_Attributes is type Form_Focus_On_Click_Attribute_Node is new Matreshka.ODF_Form.Abstract_Form_Attribute_Node and ODF.DOM.Form_Focus_On_Click_Attributes.ODF_Form_Focus_On_Click_Attribute with null record; overriding function Create (Parameters : not null access Matreshka.DOM_Attributes.Attribute_L2_Parameters) return Form_Focus_On_Click_Attribute_Node; overriding function Get_Local_Name (Self : not null access constant Form_Focus_On_Click_Attribute_Node) return League.Strings.Universal_String; end Matreshka.ODF_Form.Focus_On_Click_Attributes;
BrickBot/Bound-T-H8-300
Ada
42,379
adb
-- Programs.Execution.Tables (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.8 $ -- $Date: 2015/10/24 20:05:51 $ -- -- $Log: programs-execution-tables.adb,v $ -- Revision 1.8 2015/10/24 20:05:51 niklas -- Moved to free licence. -- -- Revision 1.7 2009-01-18 07:58:32 niklas -- Removed unused context clauses and locals. -- -- Revision 1.6 2008/11/09 21:43:05 niklas -- BT-CH-0158: Output.Image (Time_T) replaces Programs.Execution.Image. -- -- Revision 1.5 2005/10/09 08:10:23 niklas -- BT-CH-0013. -- -- Revision 1.4 2005/09/23 10:51:41 niklas -- BT-CH-0012. -- -- Revision 1.3 2005/08/24 10:17:04 niklas -- Using the new inquiry function Programs.Node (Call). -- -- Revision 1.2 2005/02/16 21:11:47 niklas -- BT-CH-0002. -- -- Revision 1.1 2004/05/01 09:56:09 niklas -- First version. -- package body Programs.Execution.Tables is use type Processor.Time_T; function Is_Null (Item : Time_Range_T) return Boolean is begin return Item.Min > Item.Max; end Is_Null; -- -- Helpful operations -- procedure Add_Number ( Number : in Natural; To : in out Natural) -- -- Adds the Number To a sum. -- is begin To := To + Number; end Add_Number; procedure Add_Time ( Time : in Processor.Time_T; To : in out Processor.Time_T) -- -- Adds the Number To a sum. -- is begin To := To + Time; end Add_Time; procedure Include ( Time : in Processor.Time_T; Within : in out Time_Range_T) -- -- Includes a Time Within a time-range, possibly widening the range. -- is begin Within.Min := Processor.Time_T'Min (Within.Min, Time); Within.Max := Processor.Time_T'Max (Within.Max, Time); end Include; function Union (Left, Right : Time_Range_T) return Time_Range_T -- -- Union of time intervals. -- is begin if Is_Null (Left ) then return Right; elsif Is_Null (Right) then return Left; else return ( Min => Processor.Time_T'Min (Left.Min, Right.Min), Max => Processor.Time_T'Max (Left.Max, Right.Max)); end if; end Union; -- -- Adding a link to a share -- procedure Add (Share : in Share_T; To : in out Share_T) -- -- Adds the given Share To a sum of shares. -- is begin To.Link_Paths := To.Link_Paths + Share.Link_Paths; To.Counted_Paths := To.Counted_Paths + Share.Counted_Paths; To.Calls := To.Calls + Share.Calls; To.Timed_Paths := To.Timed_Paths + Share.Timed_Paths; To.Asserted_Paths := To.Asserted_Paths + Share.Asserted_Paths; To.Time := Union (To.Time , Share.Time ); To.Time_Per_Call := Union (To.Time_Per_Call, Share.Time_Per_Call); To.Bounded_Paths := To.Bounded_Paths + Share.Bounded_Paths; To.Bounded_Calls := To.Bounded_Calls + Share.Bounded_Calls; To.Total_Time := To.Total_Time + Share.Total_Time; end Add; procedure Add_To_Share( Paths : in Natural; Bounds : in Bounds_Ref; Count_Bounded : in Boolean; Count : in Flow.Execution.Count_T; Share : in out Share_T) -- -- Adds the given Bounds to the Share, knowing that these Bounds -- are reached via Paths new link-paths (that is, link-paths not -- before considered in this Share). Count_Bounded shows whether the -- execution count of each of these paths is bounded, and Count is -- then the bound on the total execution count of all these paths. -- -- This operation shall not be used in cases where only some of -- the Paths have a bounded execution count -- it should be all or -- none, as shown by Count_Bounded. -- is Full_Time : Processor.Time_T; -- The bound on the execution time in Bounds, if any. -- The time spent in lower-level callees is included. begin Add_Number (Number => Paths, To => Share.Link_Paths); if Count_Bounded then Add_Number (Number => Paths, To => Share.Counted_Paths); Add_Number (Number => Count, To => Share.Calls); end if; if Time_Bounded (Bounds) then Add_Number (Number => Paths, To => Share.Timed_Paths); if Time_Asserted (Bounds) then Add_Number (Number => Paths, To => Share.Asserted_Paths); end if; Full_Time := Time (Bounds); Include (Time => Full_Time, Within => Share.Time); if (not Count_Bounded) or else Count > 0 then -- These Bounds are, or might be, on the worst-case path. Include (Time => Full_Time, Within => Share.Time_Per_Call); end if; if Count_Bounded then Add_Number (Number => Paths, To => Share.Bounded_Paths); Add_Number (Number => Count, To => Share.Bounded_Calls); Add_Time (Time => Count * Full_Time, To => Share.Total_Time); end if; end if; end Add_To_Share; procedure Add_To_Self ( Bounds : in Bounds_Ref; Factor : in Flow.Execution.Count_T; Calls : in Call_Bounds_List_T; Self : in out Processor.Time_T) -- -- Divides the total execution time of the Bounds (taken Factor -- times) into a "self" part and a "non-self" or "callee" part that -- is spent in the Calls from the Bounds. Adds the "self" part to -- the Self parameter. -- -- This assumes that the Bounds have a bounded execution time and -- bounded execution counts; otherwise the operation is null. -- is Total : Processor.Time_T; Non_Self : Processor.Time_T; -- The total and the "non-self" time. begin if Time_Bounded (Bounds) then -- There is a time bound, either asserted or computed. Total := Time (Bounds); if Time_Asserted (Bounds) then -- An asserted time is "all self". Add_Time ( Time => Factor * Total, To => Self); elsif Counts_Set (Bounds) then -- We should be able to divide the Total_Time into a -- Self time and a Non_Self (callee) time. Non_Self := Total_Time (Calls, Bounds); if Non_Self > Total then Output.Fault ( Location => "Programs.Execution.Tables.Add_To_Self", Locus => Locus (Bounds), Text => "Non_Self time =" & Output.Image (Non_Self) & " exceeds Total time =" & Output.Image (Total)); else Add_Time ( Time => Factor * (Total - Non_Self), To => Self); end if; end if; end if; end Add_To_Self; -- -- Table indices -- subtype Possible_Row_Index_T is Natural; -- -- The index of a row in a table, or zero to mean "no row". No_Row : constant Possible_Row_Index_T := 0; -- -- To indicate that no table row has been assigned. subtype Row_Index_T is Possible_Row_Index_T range 1 .. Possible_Row_Index_T'Last; -- -- The index of a row in a table. -- -- Collecting execution bounds from a root closure -- generic with procedure Visit ( Bounds : in Bounds_Ref; Factor_Bounded : in Boolean; Factor : in Flow.Execution.Count_T; Calls : in Call_Bounds_List_T; Go_Below : out Boolean); -- -- Visits the given Bounds, knowing that these Bounds are invoked -- from one new (not before considered) link-path a total of Factor -- times in higher-level (caller) bounds (if Factor_Bounded). -- Sets Go_Below to show whether Calls, the links from these -- Bounds to callees, should also be traversed. procedure Bounds_Traversal (Root : in Bounds_Ref); -- -- Traverses all (or perhaps not) link-paths in the Root bounds, -- calling Visit once for each link-path to a given Bounds, -- collecting execution-count information on the way. The visit -- order is top-down, depth-first. procedure Bounds_Traversal (Root : in Bounds_Ref) is procedure Visit_Subtree ( Bounds : in Bounds_Ref; Factor_Bounded : in Boolean; Factor : in Flow.Execution.Count_T) -- -- Visits the given Bounds, and lower-level callee bounds if -- permitted, knowing that these Bounds are invoked from one new -- (not before considered) link-path a total of Factor times in -- higher-level (caller) bounds (if Factor_Bounded). -- is Calls : constant Call_Bounds_List_T := Call_Bounds (Bounds); -- The bounds on feasible lower-level callees. Bounded_Counts : constant Boolean := Counts_Set (Bounds); -- Whether the execution counts of nodes (in particular, -- calls) in Bounds are bounded. Go_Below : Boolean; -- Whether we should visit the Calls. Call_Factor : Flow.Execution.Count_T := 1; -- The number of times one of the Calls is executed for one -- execution of the Bounds, if bounded, else 1. begin Visit ( Bounds => Bounds, Factor_Bounded => Factor_Bounded, Factor => Factor, Calls => Calls, Go_Below => Go_Below); if Go_Below then for C in Calls'Range loop if Bounded_Counts then Call_Factor := Call_Count (Calls(C).Call, Bounds); end if; Visit_Subtree ( Bounds => Calls(C).Bounds, Factor_Bounded => Factor_Bounded and Bounded_Counts, Factor => Factor * Call_Factor); end loop; end if; end Visit_Subtree; begin -- Bounds_Traversal Visit_Subtree ( Bounds => Root, Factor_Bounded => True, Factor => 1); end Bounds_Traversal; -- -- Tables of Subprogram_Row_T -- function Subprogram_Table (Root : Bounds_Ref) return Subprogram_Table_T is Program : constant Program_T := Programs.Execution.Program (Root); -- The program under analysis. Max_Sub_Index : constant Subprogram_Count_T := Number_Of_Subprograms (Program); -- The total number of subprograms in the program. Max_Rows : constant Natural := Natural (Max_Sub_Index); -- The total number of subprograms in the program is an upper -- limit on the number of rows in the table. Num_Rows : Natural := 0; -- The number of rows defined in the table so far. Table : Subprogram_Table_T (1 .. Max_Rows); -- The table, with Table(1 .. Num_Rows) filled. Row_Index : array (1 .. Max_Sub_Index) of Possible_Row_Index_T := ( others => No_Row); -- The row index assigned to a particular subprogram. -- Initially no rows have been assigned. procedure Add_To_Table ( Bounds : in Bounds_Ref; Factor_Bounded : in Boolean; Factor : in Flow.Execution.Count_T; Calls : in Call_Bounds_List_T; Go_Below : out Boolean) -- -- Adds the given Bounds to the Table, knowing that these Bounds -- are invoked from one new (not before considered) link-path a -- total of Factor times in higher-level (caller) bounds (if -- Factor_Bounded). -- -- To be used as a Visit for Bounds_Traversal. Sets Go_Below to True. -- is Sub_Index : constant Subprogram_Index_T := Index (Subprogram (Bounds)); -- The index of the subprogram to which the Bounds apply. Row : Row_Index_T; -- The Row for Subprogram (Bounds). begin -- Find the Table Row for this subprogram: if Row_Index(Sub_Index) = No_Row then -- First encounter with this Subprogram. -- Allocate the next row for it: Num_Rows := Num_Rows + 1; Row := Num_Rows; Row_Index(Sub_Index) := Row; Table(Row) := ( Subprogram => Subprogram (Bounds), Share => No_Share, Self_Time => 0); else -- This Subprogram already has a row allocated. Row := Row_Index(Sub_Index); end if; -- Add the Bounds to the Row: Add_To_Share ( Paths => 1, Bounds => Bounds, Count_Bounded => Factor_Bounded, Count => Factor, Share => Table(Row).Share); if Factor_Bounded then Add_To_Self ( Bounds => Bounds, Factor => Factor, Calls => Calls, Self => Table(Row).Self_Time); end if; Go_Below := True; end Add_To_Table; procedure Build_Table is new Bounds_Traversal (Visit => Add_To_Table); begin -- Subprogram_Table Build_Table (Root); return Table(1 .. Num_Rows); exception when X : others => Output.Exception_Info ( Locus => Locus (Root), Text => "Programs.Execution.Tables.Subprogram_Table", Occurrence => X); return Table(1 .. 0); end Subprogram_Table; -- -- Tables of Call_Row_T -- function Call_Table (Root : Bounds_Ref) return Call_Table_T is Max_Sub_Index : constant Subprogram_Count_T := Number_Of_Subprograms (Program (Root)); -- The total number of subprograms in the program under analysis. Max_Calls : constant Natural := Number_Of_All_Calls (Program (Root)); -- The total number of calls (call sites, Call_T) in the program -- under analysis. Table : Call_Table_T (1 .. Max_Calls); -- Working space for tabulating the calls. -- At first, each subprogram is given a slice of this Table with -- as many elements as there are call sites (Call_T) in the -- subprogram. Then, some (or all) of these elements are used to -- hold the Call_Rows with this subprogram as the Callee. -- The unused elements are marked by Caller = No_Subprogram. -- Finally, the unused elements are deleted and the dense -- Table is returned. First_Free_Row : Row_Index_T := 1; -- The first free (unallocated) row in the Table. Last_Row : Natural := 0; -- The final result will be Table(1 .. Last_Row), after omitting -- the unused Table elements. type Ref_T is record First_Row : Possible_Row_Index_T; Last_Row : Possible_Row_Index_T; end record; -- -- For each subprogram we process (in the Root closure), pointers -- to the Table-slice that holds the Call_Rows with this -- subprogram as the Callee. -- -- First_Row -- The first row in Table allocated to calls from this -- subprogram. If this is No_Row, the Ref_T is unused (it -- corresponds to a Subprogram_Index that does not occur -- in the closure of this Root). -- Last_Row -- The last row in Table containing calls from this -- subprogram. If < First_Row, there are none. -- -- The range Table(First_Row .. Last_Row) contains the so-far -- defined Call_Time_Rows with this subprogram as the Callee. No_Ref : constant Ref_T := ( First_Row => No_Row, Last_Row => No_Row); -- A nice initial value. Ref : array (1 .. Max_Sub_Index) of Ref_T := (others => No_Ref); -- Reference information for all subprogram indices. procedure Find_Row ( Call : in Call_T; Ref : in out Ref_T; Row : out Row_Index_T) -- -- Finds or creates the Table row for this Call. -- The Ref parameter is the Ref entry for Caller(Call), possibly -- still No_Ref. -- is Callee : constant Subprogram_T := Programs.Callee (Call); -- The callee. Poss_Row : Possible_Row_Index_T := No_Row; -- A possible existing row. begin -- Have we seen this caller subprogram before? if Ref.First_Row = No_Row then -- Well hello, new caller subprogram! We will give -- you some space in the Table, right away! Ref.First_Row := First_Free_Row; Ref.Last_Row := First_Free_Row - 1; First_Free_Row := First_Free_Row + Number_Of_Calls_From (Caller (Call)); end if; -- Find the Table row for this caller-callee combination: for R in Ref.First_Row .. Ref.Last_Row loop if Table(R).Callee = Callee then -- Found it. Poss_Row := R; exit; end if; end loop; if Poss_Row /= No_Row then -- The row already exists. Row := Poss_Row; else -- This caller-callee combination is a new one. -- Take a new Table element for it. Ref.Last_Row := Ref.Last_Row + 1; Row := Ref.Last_Row; Table(Row) := ( Caller => Caller (Call), Callee => Callee, Share => No_Share); end if; end Find_Row; procedure Add_To_Table ( Bounds : in Bounds_Ref; Factor_Bounded : in Boolean; Factor : in Flow.Execution.Count_T; Calls : in Call_Bounds_List_T; Go_Below : out Boolean) -- -- Adds the Calls from the given Bounds to the Table, knowing -- (if Factor_Bounded is True) that these Bounds are invoked in -- total Factor times in higher-level (caller) bounds. -- -- This operation is presented as a Visit for Bounds_Traversal, -- so the Go_Below parameter is set True to include callees. -- is Caller : constant Subprogram_Index_T := Index (Subprogram (Bounds)); -- The index of the bounded subprogram; the caller. Count_Bounded : constant Boolean := Factor_Bounded and Counts_Set (Bounds); -- Whether the total execution count of a call is bounded. Call_Factor : Flow.Execution.Count_T := 1; -- The number of times one of the Calls is executed per -- execution of the caller, if known, else 1. Call_Row : Row_Index_T; -- The table row for a call. begin for C in Calls'Range loop if Count_Bounded then Call_Factor := Call_Count (Calls(C).Call, Bounds); end if; Find_Row ( Call => Calls(C).Call, Ref => Ref(Caller), Row => Call_Row); Add_To_Share ( Paths => 1, Bounds => Calls(C).Bounds, Count_Bounded => Count_Bounded, Count => Factor * Call_Factor, Share => Table(Call_Row).Share); end loop; Go_Below := True; end Add_To_Table; procedure Build_Table is new Bounds_Traversal (Visit => Add_To_Table); begin -- Call_Table -- Cumulate the bounds and counts per caller-callee pair: Build_Table (Root); -- Compress the Table by omitting the unused elements: for T in 1 .. First_Free_Row - 1 loop if Table(T).Caller /= No_Subprogram then Last_Row := Last_Row + 1; Table(Last_Row) := Table(T); end if; end loop; return Table(1 .. Last_Row); exception when X : others => Output.Exception_Info ( Locus => Locus (Root), Text => "Programs.Execution.Tables.Call_Table", Occurrence => X); return Table(1 .. 0); end Call_Table; procedure Tabulate_Subprogram_Bounds ( Root : in Bounds_Ref; Qualified : in Boolean) is Table : constant Subprogram_Table_T := Subprogram_Table (Root); -- The table of time bounds per subprogram. Root_Nest_Mark : Output.Nest_Mark_T; -- Marks the Root locus in the output locus stack. Sep : constant Character := Output.Field_Separator; -- Abbreviation. Row : Subprogram_Row_T; -- The current row in the Table. Sub_Locus : Output.Locus_T; -- The locus of the subprogram of the current Row. begin Root_Nest_Mark := Output.Nest (Locus (Root)); for T in Table'Range loop if Table(T).Share.Calls > 0 then -- This subprogram is on the worst-case path. Row := Table(T); Sub_Locus := Locus ( Subprogram => Row.Subprogram, Qualified => Qualified); Output.Result ( Key => "Time_Table", Text => Output.Image (Row.Share.Total_Time) & Sep & Output.Image (Row.Self_Time) & Sep & Output.Image (Row.Share.Calls) & Sep & Output.Image (Row.Share.Time_Per_Call.Min) & Sep & Output.Image (Row.Share.Time_Per_Call.Max) & Sep & Output.Call_Path (Sub_Locus) & Sep & Output.Source_File (Sub_Locus) & Sep & Output.Image (Output.Statements (Sub_Locus))); end if; end loop; Output.Unnest (Root_Nest_Mark); exception when X : others => Output.Exception_Info ( Text => "Programs.Execution.Tables.Tabulate_Time_Bounds", Occurrence => X); Output.Unnest (Root_Nest_Mark); end Tabulate_Subprogram_Bounds; -- -- Tables of subprograms and their bounds -- function Subprograms_Under ( Root : Bounds_Ref; Within : Bounds_Set_T) return Subprogram_List_T is Bounds_Seen : Bounds_Subset_T (Max_Size => Number_Of_Bounds (Within)); -- The set of execution bounds visited so far. -- Initially empty by default. Subs_Seen : Subprogram_Set_T; -- The set of subprograms visited so far. -- Initially empty by default. procedure Visit (Bounds : in Bounds_Ref); -- -- See below. procedure Visit_Calls (Call_Bounds : in Call_Bounds_List_T) -- -- Visits the execution bounds in the Call_Bounds. -- is begin for C in Call_Bounds'Range loop Visit (Call_Bounds(C).Bounds); end loop; end Visit_Calls; procedure Visit (Bounds : in Bounds_Ref) -- -- Visits these Bounds and the linked bounds. -- is begin if not Is_Member (Item => Bounds, Of_Set => Bounds_Seen) then -- We have not visited these Bounds before. Add (Item => Bounds, To => Bounds_Seen); Add (To => Subs_Seen, Adding => Subprogram (Bounds)); Visit_Calls (Call_Bounds (Bounds)); end if; end Visit; begin -- Subprograms_Under Visit (Root); declare Subs : constant Subprogram_List_T := To_List (Subs_Seen); begin Erase (Subs_Seen); return Subs; end; end Subprograms_Under; function All_Bounds_For ( Subprogram : Subprogram_T; Under_Root : Bounds_Ref; Within : Bounds_Set_T) return Bounds_Table_T is Max_Bounds : constant Natural := Number_Of_Bounds (Sub => Subprogram, Within => Within); -- An upper limit on the number of execution-bounds for this -- Subprogram under this root. subtype Place_T is Positive range 1 .. Max_Bounds; Table : Bounds_Table_T (Place_T); Last : Natural := 0; -- The bounds for the Subprogram will be collected in Table(1 .. Last). procedure Visit ( Bounds : in Bounds_Ref; Factor_Bounded : in Boolean; Factor : in Flow.Execution.Count_T; Calls : in Call_Bounds_List_T; Go_Below : out Boolean) -- -- Visits these Bounds, counted Factor times (if Factor_Bounded). -- Sets Go_Below to True if the Calls should be traversed (that is, -- if these Bounds are not for the chosen Subprogram). -- -- To be used as a Visit for Bounds_Traversal. -- is New_Bounds : Boolean := True; -- Whether this is the first time these Bounds for the -- Subprogram are visited. Place : Place_T; -- The place for these Bounds in the Table. begin if Programs.Execution.Subprogram (Bounds) = Subprogram then -- These bounds to be included in the result. -- Find the Place: for L in 1 .. Last loop if Table(L).Bounds = Bounds then -- These Bounds are already listed. Place := L; New_Bounds := False; exit; end if; end loop; if New_Bounds then -- First time we visit these Bounds. -- Add them to the Table: Last := Last + 1; Place := Last; Table(Place) := ( Bounds => Bounds, Share => No_Share, Self_Time => 0); end if; Add_To_Share ( Paths => 1, Bounds => Bounds, Count_Bounded => Factor_Bounded, Count => Factor, Share => Table(Place).Share); if Factor_Bounded then Add_To_Self ( Bounds => Bounds, Factor => Factor, Calls => Calls, Self => Table(Place).Self_Time); end if; -- There is no need to visit the callees, because they -- cannot (in the absence of recursion) include bounds -- of this Subprogram: Go_Below := False; else -- Need to visit the callees to find instances of -- this Subprogram. Go_Below := True; end if; end Visit; procedure Build_Table is new Bounds_Traversal (Visit => Visit); begin -- All_Bounds_For Build_Table (Root => Under_Root); return Table(1 .. Last); end All_Bounds_For; function Min_Time (Bounds : Bounds_Table_T) return Bounds_Row_T is Quickest : Bounds_Row_T := No_Bounds_Row; -- The minimum. Candidate : Bounds_Ref; -- One of the Bounds. begin for B in Bounds'Range loop Candidate := Bounds(B).Bounds; if Time_Bounded (Candidate) and then ( Quickest.Bounds = No_Bounds or else Time (Candidate) < Time (Quickest.Bounds)) then -- A quicker one. Quickest := Bounds(B); end if; end loop; return Quickest; end Min_Time; function Max_Time (Bounds : Bounds_Table_T) return Bounds_Row_T is Slowest : Bounds_Row_T := No_Bounds_Row; -- The maximum. Candidate : Bounds_Ref; -- One of the Bounds. begin for B in Bounds'Range loop Candidate := Bounds(B).Bounds; if Time_Bounded (Candidate) and then ( Slowest.Bounds = No_Bounds or else Time (Candidate) > Time (Slowest.Bounds)) then -- A slower one. Slowest := Bounds(B); end if; end loop; return Slowest; end Max_Time; function Is_Null (Item : Count_Range_T) return Boolean is begin return Item.Min > Item.Max; end Is_Null; procedure Include ( Count : in Flow.Execution.Count_T; Within : in out Count_Range_T) -- -- Includes the Count Within the range, extending the range as needed. -- is begin Within.Min := Flow.Execution.Count_T'Min (Within.Min, Count); Within.Max := Flow.Execution.Count_T'Max (Within.Max, Count); end Include; function Total_Times_And_Counts ( Executing : Subprogram_T; Bounds : Bounds_Table_T) return Total_Times_And_Counts_T is Graph : constant Flow.Graph_T := Flow_Graph (Executing); -- The flow-graph of the subprogram. Totals : Total_Times_And_Counts_T ( Nodes => Flow.Max_Node (Graph), Edges => Flow.Max_Edge (Graph)); -- The totals to be cumulated. Candidate : Bounds_Ref; -- One of the candidate terms from Bounds. Candidate_Share : Share_T; -- The execution-share of the candidate. Candidate_Times_Bounded : Boolean; -- Whether the execution time of nodes and edges is -- bounded, in the Candidate. Candidate_Counts_Bounded : Boolean; -- Whether the execution count of nodes and edges is -- bounded, in the Candidate. Candidate_Calls_Bounded : Boolean; -- Whether some number of calls of the Candidate is known. Candidate_Fully_Bounded : Boolean; -- Whether the Candidate is bounded enough to compute its -- contribution to the total execution time. procedure Add_Candidate ( Time : in Processor.Time_T; Self : in Processor.Time_T; Count : in Flow.Execution.Count_T; To : in out Total_Time_Count_T) -- -- Adds the Time etc for a given node or edge in the Candidate, -- To the Totals summary for that node or edge, depending on which -- aspects of the Candidate are bounded. -- is Bounded_Count : Flow.Execution.Count_T; -- The total number of times the node or edge is executed -- in a path to the Candidate where the number of calls -- is bounded and the execution-counts and execution-time -- of the Candidate is bounded. begin -- Times per call: if Candidate_Times_Bounded then Include (Time => Time, Within => To.Time); Include (Time => Self, Within => To.Self); Include (Time => Time - Self, Within => To.Callees); end if; -- Counts per call, and total calls: if Candidate_Counts_Bounded then Include (Count => Count, Within => To.Count); if Candidate_Calls_Bounded then Add_Number ( Number => Candidate_Share.Calls * Count, To => To.Total_Count); end if; end if; -- Total times: if Candidate_Fully_Bounded then Bounded_Count := Candidate_Share.Bounded_Calls * Count; Add_Time ( Time => Bounded_Count * Time, To => To.Total_Time); Add_Time ( Time => Bounded_Count * Self, To => To.Total_Self); end if; end Add_Candidate; Node : Flow.Node_T; -- A node in the graph. Edge : Flow.Edge_T; -- An edge in the graph. begin -- Total_Times_And_Counts -- Initialize the Totals: Totals.Subprogram := Executing; Totals.Share := No_Share; Totals.Self_Time := 0; Totals.Bounded := 0; for N in Totals.Node'Range loop Totals.Node(N) := No_Time_Count; end loop; for E in Totals.Edge'Range loop Totals.Edge(E) := No_Time_Count; end loop; -- Cumulate the totals: for B in Bounds'Range loop Candidate := Bounds(B).Bounds; Candidate_Share := Bounds(B).Share; if Subprogram (Candidate) /= Executing then Output.Fault ( Location => "Programs.Execution.Tables.Total_Times_And_Counts", Text => "Subprogram (Bounds (" & Positive'Image (B) & " ) = " & Name (Subprogram (Candidate)) & " /= " & Name (Executing)); exit; end if; -- This Candidate stands for some execution share: Add (Share => Candidate_Share, To => Totals.Share); Add_Time (Time => Bounds(B).Self_Time, To => Totals.Self_Time); Candidate_Times_Bounded := Node_Times_Bounded (Candidate); Candidate_Counts_Bounded := Counts_Set (Candidate); Candidate_Calls_Bounded := Candidate_Share.Bounded_Paths > 0; Candidate_Fully_Bounded := Candidate_Times_Bounded and Candidate_Counts_Bounded and Candidate_Calls_Bounded; if (Candidate_Times_Bounded or Candidate_Counts_Bounded) and not Time_Asserted (Candidate) then Add_Number (Number => 1, To => Totals.Bounded); end if; -- Cumulate each node and edge: for N in Totals.Node'Range loop Node := Flow.Node_At (Index => N, Within => Graph); Add_Candidate ( Time => Time (Node, Candidate, With_Calls => True ), Self => Time (Node, Candidate, With_Calls => False), Count => Count (Node, Candidate), To => Totals.Node(N)); end loop; for E in Totals.Edge'Range loop Edge := Flow.Edge_At (Index => E, Within => Graph); Add_Candidate ( Time => Time (Edge, Candidate), Self => Time (Edge, Candidate), Count => Count (Edge, Candidate), To => Totals.Edge(E)); end loop; end loop; return Totals; end Total_Times_And_Counts; -- -- Tables of execution bounds and links between bounds -- function Bounds_Table ( Root : Bounds_Ref; Within : Bounds_Set_T) return Bounds_Table_T is Num_Bounds : constant Bounds_Count_T := Number_Of_Bounds (Within); -- The total number of execution bounds in this Bounds_Set; and -- so an upper limit on the index of the execution bounds in the -- table. Table : Bounds_Table_T (1 .. Natural (Num_Bounds)); Last : Possible_Row_Index_T := No_Row; -- The collected bounds-rows will be Table(1 .. Last). Row_Index : array (1 .. Num_Bounds) of Possible_Row_Index_T := ( others => No_Row); -- Shows the place in Table that holds the execution bounds with -- a given index. Of course, No_Row indicates that the bounds are -- not yet in the Table. procedure Add_To_Table ( Bounds : in Bounds_Ref; Factor_Bounded : in Boolean; Factor : in Flow.Execution.Count_T; Calls : in Call_Bounds_List_T; Go_Below : out Boolean) -- -- Adds the given Bounds to the Table, knowing that these Bounds -- are invoked from one new (not before considered) link-path a -- total of Factor times in higher-level (caller) bounds (if -- Factor_Bounded). -- -- To be used as a Visit for Bounds_Traversal. Sets Go_Below to True. -- is Bounds_Index : constant Bounds_Index_T := Index (Bounds); -- The unique index of these Bounds. Row : Row_Index_T; -- The Table row for the Bounds. begin -- Find the Row: if Row_Index(Bounds_Index) = No_Row then -- First encounter with these Bounds. -- Allocate the next row for it: Last := Last + 1; Row := Last; Row_Index(Bounds_Index) := Row; Table(Row) := ( Bounds => Bounds, Share => No_Share, Self_Time => 0); else -- These Bounds already have a row allocated. Row := Row_Index(Bounds_Index); end if; -- Add the Bounds to the Row: Add_To_Share ( Paths => 1, Bounds => Bounds, Count_Bounded => Factor_Bounded, Count => Factor, Share => Table(Row).Share); if Factor_Bounded then Add_To_Self ( Bounds => Bounds, Factor => Factor, Calls => Calls, Self => Table(Row).Self_Time); end if; Go_Below := True; end Add_To_Table; procedure Build_Table is new Bounds_Traversal (Visit => Add_To_Table); begin -- Bounds_Table Build_Table (Root); return Table(1 .. Last); exception when X : others => Output.Exception_Info ( Locus => Locus (Root), Text => "Programs.Execution.Tables.Bounds_Table", Occurrence => X); return Table(1 .. 0); end Bounds_Table; function Links (From : Bounds_Row_T) return Links_Table_T is Calls : constant Call_Bounds_List_T := Call_Bounds (From.Bounds); -- The calls and bounds of feasible lower-level callees. Call_Count_Bounded : constant Boolean := From.Share.Counted_Paths > 0 and Counts_Set (From.Bounds); -- Whether the number of executions (calls) of the caller is -- bounded, and the execution counts within the caller are -- bounded, so that the number of executions of all Calls are -- bounded. Table : Links_Table_T (1 .. Calls'Length); Last : Possible_Row_Index_T := No_Row; -- The collected links-rows will be Table(1 .. Last). -- All Table elements have the same Caller = From. -- All Calls with the same Call.Bounds (and thus the same callee -- too) are summarised in one and the same Table element. procedure Add_To_Table (Call : in Call_Bounds_T) -- -- Adds the given Call to the Table. -- is Row : Possible_Row_Index_T := No_Row; -- The Table row for the Call. Count : Flow.Execution.Count_T := 0; -- The execution count of this Call, if bounded, else zero. begin -- Find the Row: for T in 1 .. Last loop if Table(T).Callee = Call.Bounds then -- These Call.Bounds already have a row allocated. Row := T; exit; end if; end loop; if Row = No_Row then -- First encounter with these Call.Bounds. -- Allocate the next row for it: Last := Last + 1; Row := Last; Table(Row) := ( Caller => From.Bounds, Callee => Call.Bounds, Share => No_Share); end if; -- Find the number of calls: if Call_Count_Bounded then Count := From.Share.Calls * Call_Count (Call => Call.Call, Within => From.Bounds); end if; -- Add the Call.Bounds to the Row, taking into account the -- number of link-paths to the caller, From: -- to the caller, From: Add_To_Share ( Paths => From.Share.Link_Paths, Bounds => Call.Bounds, Count_Bounded => Call_Count_Bounded, Count => Count, Share => Table(Row).Share); end Add_To_Table; begin -- Links_Table for C in Calls'Range loop Add_To_Table (Call => Calls(C)); end loop; return Table(1 .. Last); exception when X : others => Output.Exception_Info ( Locus => Locus (From.Bounds), Text => "Programs.Execution.Tables.Links_Table", Occurrence => X); return Table(1 .. 0); end Links; end Programs.Execution.Tables;
reznikmm/matreshka
Ada
38,844
adb
------------------------------------------------------------------------------ -- -- -- Matreshka Project -- -- -- -- Ada Modeling Framework -- -- -- -- Runtime Library Component -- -- -- ------------------------------------------------------------------------------ -- -- -- Copyright © 2012, Vadim Godunko <[email protected]> -- -- All rights reserved. -- -- -- -- Redistribution and use in source and binary forms, with or without -- -- modification, are permitted provided that the following conditions -- -- are met: -- -- -- -- * Redistributions of source code must retain the above copyright -- -- notice, this list of conditions and the following disclaimer. -- -- -- -- * Redistributions in binary form must reproduce the above copyright -- -- notice, this list of conditions and the following disclaimer in the -- -- documentation and/or other materials provided with the distribution. -- -- -- -- * Neither the name of the Vadim Godunko, IE nor the names of its -- -- contributors may be used to endorse or promote products derived from -- -- this software without specific prior written permission. -- -- -- -- THIS SOFTWARE IS PROVIDED BY THE COPYRIGHT HOLDERS AND CONTRIBUTORS -- -- "AS IS" AND ANY EXPRESS OR IMPLIED WARRANTIES, INCLUDING, BUT NOT -- -- LIMITED TO, THE IMPLIED WARRANTIES OF MERCHANTABILITY AND FITNESS FOR -- -- A PARTICULAR PURPOSE ARE DISCLAIMED. IN NO EVENT SHALL THE COPYRIGHT -- -- HOLDER OR CONTRIBUTORS BE LIABLE FOR ANY DIRECT, INDIRECT, INCIDENTAL, -- -- SPECIAL, EXEMPLARY, OR CONSEQUENTIAL DAMAGES (INCLUDING, BUT NOT LIMITED -- -- TO, PROCUREMENT OF SUBSTITUTE GOODS OR SERVICES; LOSS OF USE, DATA, OR -- -- PROFITS; OR BUSINESS INTERRUPTION) HOWEVER CAUSED AND ON ANY THEORY OF -- -- LIABILITY, WHETHER IN CONTRACT, STRICT LIABILITY, OR TORT (INCLUDING -- -- NEGLIGENCE OR OTHERWISE) ARISING IN ANY WAY OUT OF THE USE OF THIS -- -- SOFTWARE, EVEN IF ADVISED OF THE POSSIBILITY OF SUCH DAMAGE. -- -- -- ------------------------------------------------------------------------------ -- $Revision$ $Date$ ------------------------------------------------------------------------------ -- This file is generated, don't edit it. ------------------------------------------------------------------------------ with AMF.CMOF; with AMF.Internals.Tables.CMOF_Attributes; with AMF.Internals.Tables.DC_String_Data_00; package body AMF.Internals.Tables.DC_Metamodel.Properties is ---------------- -- Initialize -- ---------------- procedure Initialize is begin Initialize_1; Initialize_2; Initialize_3; Initialize_4; Initialize_5; Initialize_6; Initialize_7; Initialize_8; Initialize_9; Initialize_10; Initialize_11; Initialize_12; Initialize_13; Initialize_14; Initialize_15; Initialize_16; Initialize_17; Initialize_18; Initialize_19; Initialize_20; Initialize_21; Initialize_22; Initialize_23; Initialize_24; Initialize_25; Initialize_26; Initialize_27; Initialize_28; Initialize_29; Initialize_30; Initialize_31; Initialize_32; Initialize_33; Initialize_34; Initialize_35; Initialize_36; Initialize_37; Initialize_38; Initialize_39; Initialize_40; Initialize_41; Initialize_42; Initialize_43; Initialize_44; Initialize_45; Initialize_46; Initialize_47; Initialize_48; Initialize_49; Initialize_50; Initialize_51; Initialize_52; Initialize_53; Initialize_54; Initialize_55; Initialize_56; Initialize_57; Initialize_58; Initialize_59; Initialize_60; Initialize_61; Initialize_62; Initialize_63; Initialize_64; Initialize_65; Initialize_66; Initialize_67; Initialize_68; Initialize_69; Initialize_70; Initialize_71; Initialize_72; Initialize_73; Initialize_74; Initialize_75; Initialize_76; Initialize_77; Initialize_78; Initialize_79; Initialize_80; Initialize_81; Initialize_82; Initialize_83; Initialize_84; Initialize_85; Initialize_86; Initialize_87; Initialize_88; Initialize_89; Initialize_90; Initialize_91; Initialize_92; Initialize_93; Initialize_94; Initialize_95; Initialize_96; Initialize_97; Initialize_98; end Initialize; ------------------ -- Initialize_1 -- ------------------ procedure Initialize_1 is begin AMF.Internals.Tables.CMOF_Attributes.Internal_Set_Name (Base + 1, AMF.Internals.Tables.DC_String_Data_00.MS_0033'Access); AMF.Internals.Tables.CMOF_Attributes.Internal_Set_Uri (Base + 1, AMF.Internals.Tables.DC_String_Data_00.MS_0040'Access); AMF.Internals.Tables.CMOF_Attributes.Internal_Set_Visibility (Base + 1, (Is_Empty => True)); end Initialize_1; ------------------ -- Initialize_2 -- ------------------ procedure Initialize_2 is begin AMF.Internals.Tables.CMOF_Attributes.Internal_Set_Body (Base + 2, AMF.Internals.Tables.DC_String_Data_00.MS_002A'Access); end Initialize_2; ------------------ -- Initialize_3 -- ------------------ procedure Initialize_3 is begin AMF.Internals.Tables.CMOF_Attributes.Internal_Set_Name (Base + 3, AMF.Internals.Tables.DC_String_Data_00.MS_003F'Access); AMF.Internals.Tables.CMOF_Attributes.Internal_Set_Visibility (Base + 3, (Is_Empty => True)); end Initialize_3; ------------------ -- Initialize_4 -- ------------------ procedure Initialize_4 is begin AMF.Internals.Tables.CMOF_Attributes.Internal_Set_Body (Base + 4, AMF.Internals.Tables.DC_String_Data_00.MS_0001'Access); end Initialize_4; ------------------ -- Initialize_5 -- ------------------ procedure Initialize_5 is begin AMF.Internals.Tables.CMOF_Attributes.Internal_Set_Name (Base + 5, AMF.Internals.Tables.DC_String_Data_00.MS_0015'Access); AMF.Internals.Tables.CMOF_Attributes.Internal_Set_Visibility (Base + 5, (Is_Empty => True)); end Initialize_5; ------------------ -- Initialize_6 -- ------------------ procedure Initialize_6 is begin AMF.Internals.Tables.CMOF_Attributes.Internal_Set_Body (Base + 6, AMF.Internals.Tables.DC_String_Data_00.MS_000B'Access); end Initialize_6; ------------------ -- Initialize_7 -- ------------------ procedure Initialize_7 is begin AMF.Internals.Tables.CMOF_Attributes.Internal_Set_Name (Base + 7, AMF.Internals.Tables.DC_String_Data_00.MS_0003'Access); AMF.Internals.Tables.CMOF_Attributes.Internal_Set_Visibility (Base + 7, (Is_Empty => True)); end Initialize_7; ------------------ -- Initialize_8 -- ------------------ procedure Initialize_8 is begin AMF.Internals.Tables.CMOF_Attributes.Internal_Set_Body (Base + 8, AMF.Internals.Tables.DC_String_Data_00.MS_0053'Access); end Initialize_8; ------------------ -- Initialize_9 -- ------------------ procedure Initialize_9 is begin AMF.Internals.Tables.CMOF_Attributes.Internal_Set_Name (Base + 9, AMF.Internals.Tables.DC_String_Data_00.MS_000D'Access); AMF.Internals.Tables.CMOF_Attributes.Internal_Set_Visibility (Base + 9, (Is_Empty => True)); end Initialize_9; ------------------- -- Initialize_10 -- ------------------- procedure Initialize_10 is begin AMF.Internals.Tables.CMOF_Attributes.Internal_Set_Body (Base + 10, AMF.Internals.Tables.DC_String_Data_00.MS_004C'Access); end Initialize_10; ------------------- -- Initialize_11 -- ------------------- procedure Initialize_11 is begin AMF.Internals.Tables.CMOF_Attributes.Internal_Set_Name (Base + 11, AMF.Internals.Tables.DC_String_Data_00.MS_0059'Access); AMF.Internals.Tables.CMOF_Attributes.Internal_Set_Visibility (Base + 11, (Is_Empty => True)); end Initialize_11; ------------------- -- Initialize_12 -- ------------------- procedure Initialize_12 is begin AMF.Internals.Tables.CMOF_Attributes.Internal_Set_Body (Base + 12, AMF.Internals.Tables.DC_String_Data_00.MS_0045'Access); end Initialize_12; ------------------- -- Initialize_13 -- ------------------- procedure Initialize_13 is begin AMF.Internals.Tables.CMOF_Attributes.Internal_Set_Name (Base + 13, AMF.Internals.Tables.DC_String_Data_00.MS_000C'Access); AMF.Internals.Tables.CMOF_Attributes.Internal_Set_Visibility (Base + 13, (Is_Empty => True)); end Initialize_13; ------------------- -- Initialize_14 -- ------------------- procedure Initialize_14 is begin AMF.Internals.Tables.CMOF_Attributes.Internal_Set_Body (Base + 14, AMF.Internals.Tables.DC_String_Data_00.MS_004A'Access); end Initialize_14; ------------------- -- Initialize_15 -- ------------------- procedure Initialize_15 is begin AMF.Internals.Tables.CMOF_Attributes.Internal_Set_Visibility (Base + 15, (Is_Empty => True)); end Initialize_15; ------------------- -- Initialize_16 -- ------------------- procedure Initialize_16 is begin AMF.Internals.Tables.CMOF_Attributes.Internal_Set_Name (Base + 16, AMF.Internals.Tables.DC_String_Data_00.MS_002F'Access); AMF.Internals.Tables.CMOF_Attributes.Internal_Set_Visibility (Base + 16, (False, AMF.CMOF.Public_Visibility)); end Initialize_16; ------------------- -- Initialize_17 -- ------------------- procedure Initialize_17 is begin AMF.Internals.Tables.CMOF_Attributes.Internal_Set_Body (Base + 17, AMF.Internals.Tables.DC_String_Data_00.MS_0047'Access); end Initialize_17; ------------------- -- Initialize_18 -- ------------------- procedure Initialize_18 is begin AMF.Internals.Tables.CMOF_Attributes.Internal_Set_Name (Base + 18, AMF.Internals.Tables.DC_String_Data_00.MS_002E'Access); AMF.Internals.Tables.CMOF_Attributes.Internal_Set_Visibility (Base + 18, (False, AMF.CMOF.Public_Visibility)); end Initialize_18; ------------------- -- Initialize_19 -- ------------------- procedure Initialize_19 is begin AMF.Internals.Tables.CMOF_Attributes.Internal_Set_Body (Base + 19, AMF.Internals.Tables.DC_String_Data_00.MS_0047'Access); end Initialize_19; ------------------- -- Initialize_20 -- ------------------- procedure Initialize_20 is begin AMF.Internals.Tables.CMOF_Attributes.Internal_Set_Name (Base + 20, AMF.Internals.Tables.DC_String_Data_00.MS_002C'Access); AMF.Internals.Tables.CMOF_Attributes.Internal_Set_Visibility (Base + 20, (False, AMF.CMOF.Public_Visibility)); end Initialize_20; ------------------- -- Initialize_21 -- ------------------- procedure Initialize_21 is begin AMF.Internals.Tables.CMOF_Attributes.Internal_Set_Body (Base + 21, AMF.Internals.Tables.DC_String_Data_00.MS_0047'Access); end Initialize_21; ------------------- -- Initialize_22 -- ------------------- procedure Initialize_22 is begin AMF.Internals.Tables.CMOF_Attributes.Internal_Set_Name (Base + 22, AMF.Internals.Tables.DC_String_Data_00.MS_0011'Access); AMF.Internals.Tables.CMOF_Attributes.Internal_Set_Visibility (Base + 22, (Is_Empty => True)); end Initialize_22; ------------------- -- Initialize_23 -- ------------------- procedure Initialize_23 is begin AMF.Internals.Tables.CMOF_Attributes.Internal_Set_Body (Base + 23, AMF.Internals.Tables.DC_String_Data_00.MS_001E'Access); end Initialize_23; ------------------- -- Initialize_24 -- ------------------- procedure Initialize_24 is begin AMF.Internals.Tables.CMOF_Attributes.Internal_Set_Default (Base + 24, AMF.Internals.Tables.DC_String_Data_00.MS_0008'Access); AMF.Internals.Tables.CMOF_Attributes.Internal_Set_Name (Base + 24, AMF.Internals.Tables.DC_String_Data_00.MS_003D'Access); AMF.Internals.Tables.CMOF_Attributes.Internal_Set_Visibility (Base + 24, (False, AMF.CMOF.Public_Visibility)); end Initialize_24; ------------------- -- Initialize_25 -- ------------------- procedure Initialize_25 is begin AMF.Internals.Tables.CMOF_Attributes.Internal_Set_Body (Base + 25, AMF.Internals.Tables.DC_String_Data_00.MS_0020'Access); end Initialize_25; ------------------- -- Initialize_26 -- ------------------- procedure Initialize_26 is begin AMF.Internals.Tables.CMOF_Attributes.Internal_Set_Default (Base + 26, AMF.Internals.Tables.DC_String_Data_00.MS_0008'Access); AMF.Internals.Tables.CMOF_Attributes.Internal_Set_Name (Base + 26, AMF.Internals.Tables.DC_String_Data_00.MS_0002'Access); AMF.Internals.Tables.CMOF_Attributes.Internal_Set_Visibility (Base + 26, (False, AMF.CMOF.Public_Visibility)); end Initialize_26; ------------------- -- Initialize_27 -- ------------------- procedure Initialize_27 is begin AMF.Internals.Tables.CMOF_Attributes.Internal_Set_Body (Base + 27, AMF.Internals.Tables.DC_String_Data_00.MS_0049'Access); end Initialize_27; ------------------- -- Initialize_28 -- ------------------- procedure Initialize_28 is begin AMF.Internals.Tables.CMOF_Attributes.Internal_Set_Name (Base + 28, AMF.Internals.Tables.DC_String_Data_00.MS_0054'Access); AMF.Internals.Tables.CMOF_Attributes.Internal_Set_Visibility (Base + 28, (Is_Empty => True)); end Initialize_28; ------------------- -- Initialize_29 -- ------------------- procedure Initialize_29 is begin AMF.Internals.Tables.CMOF_Attributes.Internal_Set_Body (Base + 29, AMF.Internals.Tables.DC_String_Data_00.MS_004E'Access); end Initialize_29; ------------------- -- Initialize_30 -- ------------------- procedure Initialize_30 is begin AMF.Internals.Tables.CMOF_Attributes.Internal_Set_Name (Base + 30, AMF.Internals.Tables.DC_String_Data_00.MS_004B'Access); AMF.Internals.Tables.CMOF_Attributes.Internal_Set_Visibility (Base + 30, (Is_Empty => True)); end Initialize_30; ------------------- -- Initialize_31 -- ------------------- procedure Initialize_31 is begin AMF.Internals.Tables.CMOF_Attributes.Internal_Set_Body (Base + 31, AMF.Internals.Tables.DC_String_Data_00.MS_0013'Access); end Initialize_31; ------------------- -- Initialize_32 -- ------------------- procedure Initialize_32 is begin AMF.Internals.Tables.CMOF_Attributes.Internal_Set_Visibility (Base + 32, (Is_Empty => True)); end Initialize_32; ------------------- -- Initialize_33 -- ------------------- procedure Initialize_33 is begin AMF.Internals.Tables.CMOF_Attributes.Internal_Set_Name (Base + 33, AMF.Internals.Tables.DC_String_Data_00.MS_0050'Access); AMF.Internals.Tables.CMOF_Attributes.Internal_Set_Visibility (Base + 33, (False, AMF.CMOF.Public_Visibility)); end Initialize_33; ------------------- -- Initialize_34 -- ------------------- procedure Initialize_34 is begin AMF.Internals.Tables.CMOF_Attributes.Internal_Set_Body (Base + 34, AMF.Internals.Tables.DC_String_Data_00.MS_003B'Access); end Initialize_34; ------------------- -- Initialize_35 -- ------------------- procedure Initialize_35 is begin AMF.Internals.Tables.CMOF_Attributes.Internal_Set_Name (Base + 35, AMF.Internals.Tables.DC_String_Data_00.MS_0044'Access); AMF.Internals.Tables.CMOF_Attributes.Internal_Set_Visibility (Base + 35, (False, AMF.CMOF.Public_Visibility)); end Initialize_35; ------------------- -- Initialize_36 -- ------------------- procedure Initialize_36 is begin AMF.Internals.Tables.CMOF_Attributes.Internal_Set_Body (Base + 36, AMF.Internals.Tables.DC_String_Data_00.MS_0029'Access); end Initialize_36; ------------------- -- Initialize_37 -- ------------------- procedure Initialize_37 is begin AMF.Internals.Tables.CMOF_Attributes.Internal_Set_Name (Base + 37, AMF.Internals.Tables.DC_String_Data_00.MS_0041'Access); AMF.Internals.Tables.CMOF_Attributes.Internal_Set_Visibility (Base + 37, (Is_Empty => True)); end Initialize_37; ------------------- -- Initialize_38 -- ------------------- procedure Initialize_38 is begin AMF.Internals.Tables.CMOF_Attributes.Internal_Set_Body (Base + 38, AMF.Internals.Tables.DC_String_Data_00.MS_0048'Access); end Initialize_38; ------------------- -- Initialize_39 -- ------------------- procedure Initialize_39 is begin AMF.Internals.Tables.CMOF_Attributes.Internal_Set_Name (Base + 39, AMF.Internals.Tables.DC_String_Data_00.MS_004F'Access); AMF.Internals.Tables.CMOF_Attributes.Internal_Set_Visibility (Base + 39, (Is_Empty => True)); end Initialize_39; ------------------- -- Initialize_40 -- ------------------- procedure Initialize_40 is begin AMF.Internals.Tables.CMOF_Attributes.Internal_Set_Body (Base + 40, AMF.Internals.Tables.DC_String_Data_00.MS_0023'Access); end Initialize_40; ------------------- -- Initialize_41 -- ------------------- procedure Initialize_41 is begin AMF.Internals.Tables.CMOF_Attributes.Internal_Set_Visibility (Base + 41, (Is_Empty => True)); end Initialize_41; ------------------- -- Initialize_42 -- ------------------- procedure Initialize_42 is begin AMF.Internals.Tables.CMOF_Attributes.Internal_Set_Default (Base + 42, AMF.Internals.Tables.DC_String_Data_00.MS_0008'Access); AMF.Internals.Tables.CMOF_Attributes.Internal_Set_Name (Base + 42, AMF.Internals.Tables.DC_String_Data_00.MS_003D'Access); AMF.Internals.Tables.CMOF_Attributes.Internal_Set_Visibility (Base + 42, (False, AMF.CMOF.Public_Visibility)); end Initialize_42; ------------------- -- Initialize_43 -- ------------------- procedure Initialize_43 is begin AMF.Internals.Tables.CMOF_Attributes.Internal_Set_Body (Base + 43, AMF.Internals.Tables.DC_String_Data_00.MS_0021'Access); end Initialize_43; ------------------- -- Initialize_44 -- ------------------- procedure Initialize_44 is begin AMF.Internals.Tables.CMOF_Attributes.Internal_Set_Default (Base + 44, AMF.Internals.Tables.DC_String_Data_00.MS_0008'Access); AMF.Internals.Tables.CMOF_Attributes.Internal_Set_Name (Base + 44, AMF.Internals.Tables.DC_String_Data_00.MS_0002'Access); AMF.Internals.Tables.CMOF_Attributes.Internal_Set_Visibility (Base + 44, (False, AMF.CMOF.Public_Visibility)); end Initialize_44; ------------------- -- Initialize_45 -- ------------------- procedure Initialize_45 is begin AMF.Internals.Tables.CMOF_Attributes.Internal_Set_Body (Base + 45, AMF.Internals.Tables.DC_String_Data_00.MS_003C'Access); end Initialize_45; ------------------- -- Initialize_46 -- ------------------- procedure Initialize_46 is begin AMF.Internals.Tables.CMOF_Attributes.Internal_Set_Name (Base + 46, AMF.Internals.Tables.DC_String_Data_00.MS_0050'Access); AMF.Internals.Tables.CMOF_Attributes.Internal_Set_Visibility (Base + 46, (False, AMF.CMOF.Public_Visibility)); end Initialize_46; ------------------- -- Initialize_47 -- ------------------- procedure Initialize_47 is begin AMF.Internals.Tables.CMOF_Attributes.Internal_Set_Body (Base + 47, AMF.Internals.Tables.DC_String_Data_00.MS_0032'Access); end Initialize_47; ------------------- -- Initialize_48 -- ------------------- procedure Initialize_48 is begin AMF.Internals.Tables.CMOF_Attributes.Internal_Set_Name (Base + 48, AMF.Internals.Tables.DC_String_Data_00.MS_0044'Access); AMF.Internals.Tables.CMOF_Attributes.Internal_Set_Visibility (Base + 48, (False, AMF.CMOF.Public_Visibility)); end Initialize_48; ------------------- -- Initialize_49 -- ------------------- procedure Initialize_49 is begin AMF.Internals.Tables.CMOF_Attributes.Internal_Set_Body (Base + 49, AMF.Internals.Tables.DC_String_Data_00.MS_0010'Access); end Initialize_49; ------------------- -- Initialize_50 -- ------------------- procedure Initialize_50 is begin AMF.Internals.Tables.CMOF_Attributes.Internal_Set_Name (Base + 50, AMF.Internals.Tables.DC_String_Data_00.MS_0039'Access); AMF.Internals.Tables.CMOF_Attributes.Internal_Set_Visibility (Base + 50, (Is_Empty => True)); end Initialize_50; ------------------- -- Initialize_51 -- ------------------- procedure Initialize_51 is begin AMF.Internals.Tables.CMOF_Attributes.Internal_Set_Body (Base + 51, AMF.Internals.Tables.DC_String_Data_00.MS_0034'Access); end Initialize_51; ------------------- -- Initialize_52 -- ------------------- procedure Initialize_52 is begin AMF.Internals.Tables.CMOF_Attributes.Internal_Set_Name (Base + 52, AMF.Internals.Tables.DC_String_Data_00.MS_0006'Access); AMF.Internals.Tables.CMOF_Attributes.Internal_Set_Visibility (Base + 52, (Is_Empty => True)); end Initialize_52; ------------------- -- Initialize_53 -- ------------------- procedure Initialize_53 is begin AMF.Internals.Tables.CMOF_Attributes.Internal_Set_Body (Base + 53, AMF.Internals.Tables.DC_String_Data_00.MS_0031'Access); end Initialize_53; ------------------- -- Initialize_54 -- ------------------- procedure Initialize_54 is begin AMF.Internals.Tables.CMOF_Attributes.Internal_Set_Name (Base + 54, AMF.Internals.Tables.DC_String_Data_00.MS_0038'Access); AMF.Internals.Tables.CMOF_Attributes.Internal_Set_Visibility (Base + 54, (Is_Empty => True)); end Initialize_54; ------------------- -- Initialize_55 -- ------------------- procedure Initialize_55 is begin AMF.Internals.Tables.CMOF_Attributes.Internal_Set_Body (Base + 55, AMF.Internals.Tables.DC_String_Data_00.MS_0028'Access); end Initialize_55; ------------------- -- Initialize_56 -- ------------------- procedure Initialize_56 is begin AMF.Internals.Tables.CMOF_Attributes.Internal_Set_Name (Base + 56, AMF.Internals.Tables.DC_String_Data_00.MS_002B'Access); AMF.Internals.Tables.CMOF_Attributes.Internal_Set_Visibility (Base + 56, (Is_Empty => True)); end Initialize_56; ------------------- -- Initialize_57 -- ------------------- procedure Initialize_57 is begin AMF.Internals.Tables.CMOF_Attributes.Internal_Set_Body (Base + 57, AMF.Internals.Tables.DC_String_Data_00.MS_0022'Access); end Initialize_57; ------------------- -- Initialize_58 -- ------------------- procedure Initialize_58 is begin AMF.Internals.Tables.CMOF_Attributes.Internal_Set_Name (Base + 58, AMF.Internals.Tables.DC_String_Data_00.MS_001A'Access); AMF.Internals.Tables.CMOF_Attributes.Internal_Set_Visibility (Base + 58, (Is_Empty => True)); end Initialize_58; ------------------- -- Initialize_59 -- ------------------- procedure Initialize_59 is begin AMF.Internals.Tables.CMOF_Attributes.Internal_Set_Body (Base + 59, AMF.Internals.Tables.DC_String_Data_00.MS_0024'Access); end Initialize_59; ------------------- -- Initialize_60 -- ------------------- procedure Initialize_60 is begin AMF.Internals.Tables.CMOF_Attributes.Internal_Set_Name (Base + 60, AMF.Internals.Tables.DC_String_Data_00.MS_0056'Access); AMF.Internals.Tables.CMOF_Attributes.Internal_Set_Visibility (Base + 60, (Is_Empty => True)); end Initialize_60; ------------------- -- Initialize_61 -- ------------------- procedure Initialize_61 is begin AMF.Internals.Tables.CMOF_Attributes.Internal_Set_Body (Base + 61, AMF.Internals.Tables.DC_String_Data_00.MS_002D'Access); end Initialize_61; ------------------- -- Initialize_62 -- ------------------- procedure Initialize_62 is begin AMF.Internals.Tables.CMOF_Attributes.Internal_Set_Name (Base + 62, AMF.Internals.Tables.DC_String_Data_00.MS_002F'Access); AMF.Internals.Tables.CMOF_Attributes.Internal_Set_Visibility (Base + 62, (Is_Empty => True)); end Initialize_62; ------------------- -- Initialize_63 -- ------------------- procedure Initialize_63 is begin AMF.Internals.Tables.CMOF_Attributes.Internal_Set_Body (Base + 63, AMF.Internals.Tables.DC_String_Data_00.MS_0030'Access); end Initialize_63; ------------------- -- Initialize_64 -- ------------------- procedure Initialize_64 is begin AMF.Internals.Tables.CMOF_Attributes.Internal_Set_Name (Base + 64, AMF.Internals.Tables.DC_String_Data_00.MS_0019'Access); AMF.Internals.Tables.CMOF_Attributes.Internal_Set_Visibility (Base + 64, (Is_Empty => True)); end Initialize_64; ------------------- -- Initialize_65 -- ------------------- procedure Initialize_65 is begin AMF.Internals.Tables.CMOF_Attributes.Internal_Set_Body (Base + 65, AMF.Internals.Tables.DC_String_Data_00.MS_003E'Access); end Initialize_65; ------------------- -- Initialize_66 -- ------------------- procedure Initialize_66 is begin AMF.Internals.Tables.CMOF_Attributes.Internal_Set_Name (Base + 66, AMF.Internals.Tables.DC_String_Data_00.MS_0004'Access); AMF.Internals.Tables.CMOF_Attributes.Internal_Set_Visibility (Base + 66, (Is_Empty => True)); end Initialize_66; ------------------- -- Initialize_67 -- ------------------- procedure Initialize_67 is begin AMF.Internals.Tables.CMOF_Attributes.Internal_Set_Body (Base + 67, AMF.Internals.Tables.DC_String_Data_00.MS_0036'Access); end Initialize_67; ------------------- -- Initialize_68 -- ------------------- procedure Initialize_68 is begin AMF.Internals.Tables.CMOF_Attributes.Internal_Set_Name (Base + 68, AMF.Internals.Tables.DC_String_Data_00.MS_0007'Access); AMF.Internals.Tables.CMOF_Attributes.Internal_Set_Visibility (Base + 68, (Is_Empty => True)); end Initialize_68; ------------------- -- Initialize_69 -- ------------------- procedure Initialize_69 is begin AMF.Internals.Tables.CMOF_Attributes.Internal_Set_Body (Base + 69, AMF.Internals.Tables.DC_String_Data_00.MS_001F'Access); end Initialize_69; ------------------- -- Initialize_70 -- ------------------- procedure Initialize_70 is begin AMF.Internals.Tables.CMOF_Attributes.Internal_Set_Name (Base + 70, AMF.Internals.Tables.DC_String_Data_00.MS_0051'Access); AMF.Internals.Tables.CMOF_Attributes.Internal_Set_Visibility (Base + 70, (Is_Empty => True)); end Initialize_70; ------------------- -- Initialize_71 -- ------------------- procedure Initialize_71 is begin AMF.Internals.Tables.CMOF_Attributes.Internal_Set_Body (Base + 71, AMF.Internals.Tables.DC_String_Data_00.MS_000F'Access); end Initialize_71; ------------------- -- Initialize_72 -- ------------------- procedure Initialize_72 is begin AMF.Internals.Tables.CMOF_Attributes.Internal_Set_Name (Base + 72, AMF.Internals.Tables.DC_String_Data_00.MS_0016'Access); AMF.Internals.Tables.CMOF_Attributes.Internal_Set_Visibility (Base + 72, (Is_Empty => True)); end Initialize_72; ------------------- -- Initialize_73 -- ------------------- procedure Initialize_73 is begin AMF.Internals.Tables.CMOF_Attributes.Internal_Set_Body (Base + 73, AMF.Internals.Tables.DC_String_Data_00.MS_0035'Access); end Initialize_73; ------------------- -- Initialize_74 -- ------------------- procedure Initialize_74 is begin AMF.Internals.Tables.CMOF_Attributes.Internal_Set_Name (Base + 74, AMF.Internals.Tables.DC_String_Data_00.MS_0057'Access); AMF.Internals.Tables.CMOF_Attributes.Internal_Set_Visibility (Base + 74, (Is_Empty => True)); end Initialize_74; ------------------- -- Initialize_75 -- ------------------- procedure Initialize_75 is begin AMF.Internals.Tables.CMOF_Attributes.Internal_Set_Body (Base + 75, AMF.Internals.Tables.DC_String_Data_00.MS_001D'Access); end Initialize_75; ------------------- -- Initialize_76 -- ------------------- procedure Initialize_76 is begin AMF.Internals.Tables.CMOF_Attributes.Internal_Set_Name (Base + 76, AMF.Internals.Tables.DC_String_Data_00.MS_0017'Access); AMF.Internals.Tables.CMOF_Attributes.Internal_Set_Visibility (Base + 76, (Is_Empty => True)); end Initialize_76; ------------------- -- Initialize_77 -- ------------------- procedure Initialize_77 is begin AMF.Internals.Tables.CMOF_Attributes.Internal_Set_Body (Base + 77, AMF.Internals.Tables.DC_String_Data_00.MS_0043'Access); end Initialize_77; ------------------- -- Initialize_78 -- ------------------- procedure Initialize_78 is begin AMF.Internals.Tables.CMOF_Attributes.Internal_Set_Name (Base + 78, AMF.Internals.Tables.DC_String_Data_00.MS_002E'Access); AMF.Internals.Tables.CMOF_Attributes.Internal_Set_Visibility (Base + 78, (Is_Empty => True)); end Initialize_78; ------------------- -- Initialize_79 -- ------------------- procedure Initialize_79 is begin AMF.Internals.Tables.CMOF_Attributes.Internal_Set_Body (Base + 79, AMF.Internals.Tables.DC_String_Data_00.MS_0005'Access); end Initialize_79; ------------------- -- Initialize_80 -- ------------------- procedure Initialize_80 is begin AMF.Internals.Tables.CMOF_Attributes.Internal_Set_Name (Base + 80, AMF.Internals.Tables.DC_String_Data_00.MS_000E'Access); AMF.Internals.Tables.CMOF_Attributes.Internal_Set_Visibility (Base + 80, (Is_Empty => True)); end Initialize_80; ------------------- -- Initialize_81 -- ------------------- procedure Initialize_81 is begin AMF.Internals.Tables.CMOF_Attributes.Internal_Set_Body (Base + 81, AMF.Internals.Tables.DC_String_Data_00.MS_0042'Access); end Initialize_81; ------------------- -- Initialize_82 -- ------------------- procedure Initialize_82 is begin AMF.Internals.Tables.CMOF_Attributes.Internal_Set_Name (Base + 82, AMF.Internals.Tables.DC_String_Data_00.MS_002C'Access); AMF.Internals.Tables.CMOF_Attributes.Internal_Set_Visibility (Base + 82, (Is_Empty => True)); end Initialize_82; ------------------- -- Initialize_83 -- ------------------- procedure Initialize_83 is begin AMF.Internals.Tables.CMOF_Attributes.Internal_Set_Body (Base + 83, AMF.Internals.Tables.DC_String_Data_00.MS_004D'Access); end Initialize_83; ------------------- -- Initialize_84 -- ------------------- procedure Initialize_84 is begin AMF.Internals.Tables.CMOF_Attributes.Internal_Set_Name (Base + 84, AMF.Internals.Tables.DC_String_Data_00.MS_0014'Access); AMF.Internals.Tables.CMOF_Attributes.Internal_Set_Visibility (Base + 84, (Is_Empty => True)); end Initialize_84; ------------------- -- Initialize_85 -- ------------------- procedure Initialize_85 is begin AMF.Internals.Tables.CMOF_Attributes.Internal_Set_Body (Base + 85, AMF.Internals.Tables.DC_String_Data_00.MS_000A'Access); end Initialize_85; ------------------- -- Initialize_86 -- ------------------- procedure Initialize_86 is begin AMF.Internals.Tables.CMOF_Attributes.Internal_Set_Name (Base + 86, AMF.Internals.Tables.DC_String_Data_00.MS_0012'Access); AMF.Internals.Tables.CMOF_Attributes.Internal_Set_Visibility (Base + 86, (Is_Empty => True)); end Initialize_86; ------------------- -- Initialize_87 -- ------------------- procedure Initialize_87 is begin AMF.Internals.Tables.CMOF_Attributes.Internal_Set_Body (Base + 87, AMF.Internals.Tables.DC_String_Data_00.MS_0009'Access); end Initialize_87; ------------------- -- Initialize_88 -- ------------------- procedure Initialize_88 is begin AMF.Internals.Tables.CMOF_Attributes.Internal_Set_Name (Base + 88, AMF.Internals.Tables.DC_String_Data_00.MS_0058'Access); AMF.Internals.Tables.CMOF_Attributes.Internal_Set_Visibility (Base + 88, (Is_Empty => True)); end Initialize_88; ------------------- -- Initialize_89 -- ------------------- procedure Initialize_89 is begin AMF.Internals.Tables.CMOF_Attributes.Internal_Set_Body (Base + 89, AMF.Internals.Tables.DC_String_Data_00.MS_001C'Access); end Initialize_89; ------------------- -- Initialize_90 -- ------------------- procedure Initialize_90 is begin AMF.Internals.Tables.CMOF_Attributes.Internal_Set_Name (Base + 90, AMF.Internals.Tables.DC_String_Data_00.MS_0025'Access); AMF.Internals.Tables.CMOF_Attributes.Internal_Set_Visibility (Base + 90, (Is_Empty => True)); end Initialize_90; ------------------- -- Initialize_91 -- ------------------- procedure Initialize_91 is begin AMF.Internals.Tables.CMOF_Attributes.Internal_Set_Body (Base + 91, AMF.Internals.Tables.DC_String_Data_00.MS_0018'Access); end Initialize_91; ------------------- -- Initialize_92 -- ------------------- procedure Initialize_92 is begin AMF.Internals.Tables.CMOF_Attributes.Internal_Set_Name (Base + 92, AMF.Internals.Tables.DC_String_Data_00.MS_0037'Access); AMF.Internals.Tables.CMOF_Attributes.Internal_Set_Visibility (Base + 92, (Is_Empty => True)); end Initialize_92; ------------------- -- Initialize_93 -- ------------------- procedure Initialize_93 is begin AMF.Internals.Tables.CMOF_Attributes.Internal_Set_Body (Base + 93, AMF.Internals.Tables.DC_String_Data_00.MS_0055'Access); end Initialize_93; ------------------- -- Initialize_94 -- ------------------- procedure Initialize_94 is begin AMF.Internals.Tables.CMOF_Attributes.Internal_Set_Name (Base + 94, AMF.Internals.Tables.DC_String_Data_00.MS_001B'Access); AMF.Internals.Tables.CMOF_Attributes.Internal_Set_Value (Base + 94, AMF.Internals.Tables.DC_String_Data_00.MS_003A'Access); end Initialize_94; ------------------- -- Initialize_95 -- ------------------- procedure Initialize_95 is begin AMF.Internals.Tables.CMOF_Attributes.Internal_Set_Name (Base + 95, AMF.Internals.Tables.DC_String_Data_00.MS_0046'Access); AMF.Internals.Tables.CMOF_Attributes.Internal_Set_Value (Base + 95, AMF.Internals.Tables.DC_String_Data_00.MS_0040'Access); end Initialize_95; ------------------- -- Initialize_96 -- ------------------- procedure Initialize_96 is begin AMF.Internals.Tables.CMOF_Attributes.Internal_Set_Name (Base + 96, AMF.Internals.Tables.DC_String_Data_00.MS_0027'Access); AMF.Internals.Tables.CMOF_Attributes.Internal_Set_Value (Base + 96, AMF.Internals.Tables.DC_String_Data_00.MS_0026'Access); end Initialize_96; ------------------- -- Initialize_97 -- ------------------- procedure Initialize_97 is begin AMF.Internals.Tables.CMOF_Attributes.Internal_Set_Name (Base + 97, AMF.Internals.Tables.DC_String_Data_00.MS_0027'Access); AMF.Internals.Tables.CMOF_Attributes.Internal_Set_Value (Base + 97, AMF.Internals.Tables.DC_String_Data_00.MS_0000'Access); end Initialize_97; ------------------- -- Initialize_98 -- ------------------- procedure Initialize_98 is begin AMF.Internals.Tables.CMOF_Attributes.Internal_Set_Name (Base + 98, AMF.Internals.Tables.DC_String_Data_00.MS_0027'Access); AMF.Internals.Tables.CMOF_Attributes.Internal_Set_Value (Base + 98, AMF.Internals.Tables.DC_String_Data_00.MS_0052'Access); end Initialize_98; end AMF.Internals.Tables.DC_Metamodel.Properties;
foundations/netgear-r6800
Ada
3,727
adb
---------------------------------------------------------------- -- ZLib for Ada thick binding. -- -- -- -- Copyright (C) 2002-2004 Dmitriy Anisimkov -- -- -- -- Open source license information is in the zlib.ads file. -- ---------------------------------------------------------------- -- -- $Id: buffer_demo.adb,v 1.1.1.1 2009-05-05 05:06:59 gavin_zhang Exp $ -- This demo program provided by Dr Steve Sangwine <[email protected]> -- -- Demonstration of a problem with Zlib-Ada (already fixed) when a buffer -- of exactly the correct size is used for decompressed data, and the last -- few bytes passed in to Zlib are checksum bytes. -- This program compresses a string of text, and then decompresses the -- compressed text into a buffer of the same size as the original text. with Ada.Streams; use Ada.Streams; with Ada.Text_IO; with ZLib; use ZLib; procedure Buffer_Demo is EOL : Character renames ASCII.LF; Text : constant String := "Four score and seven years ago our fathers brought forth," & EOL & "upon this continent, a new nation, conceived in liberty," & EOL & "and dedicated to the proposition that `all men are created equal'."; Source : Stream_Element_Array (1 .. Text'Length); for Source'Address use Text'Address; begin Ada.Text_IO.Put (Text); Ada.Text_IO.New_Line; Ada.Text_IO.Put_Line ("Uncompressed size : " & Positive'Image (Text'Length) & " bytes"); declare Compressed_Data : Stream_Element_Array (1 .. Text'Length); L : Stream_Element_Offset; begin Compress : declare Compressor : Filter_Type; I : Stream_Element_Offset; begin Deflate_Init (Compressor); -- Compress the whole of T at once. Translate (Compressor, Source, I, Compressed_Data, L, Finish); pragma Assert (I = Source'Last); Close (Compressor); Ada.Text_IO.Put_Line ("Compressed size : " & Stream_Element_Offset'Image (L) & " bytes"); end Compress; -- Now we decompress the data, passing short blocks of data to Zlib -- (because this demonstrates the problem - the last block passed will -- contain checksum information and there will be no output, only a -- check inside Zlib that the checksum is correct). Decompress : declare Decompressor : Filter_Type; Uncompressed_Data : Stream_Element_Array (1 .. Text'Length); Block_Size : constant := 4; -- This makes sure that the last block contains -- only Adler checksum data. P : Stream_Element_Offset := Compressed_Data'First - 1; O : Stream_Element_Offset; begin Inflate_Init (Decompressor); loop Translate (Decompressor, Compressed_Data (P + 1 .. Stream_Element_Offset'Min (P + Block_Size, L)), P, Uncompressed_Data (Total_Out (Decompressor) + 1 .. Uncompressed_Data'Last), O, No_Flush); Ada.Text_IO.Put_Line ("Total in : " & Count'Image (Total_In (Decompressor)) & ", out : " & Count'Image (Total_Out (Decompressor))); exit when P = L; end loop; Ada.Text_IO.New_Line; Ada.Text_IO.Put_Line ("Decompressed text matches original text : " & Boolean'Image (Uncompressed_Data = Source)); end Decompress; end; end Buffer_Demo;
rogermc2/GA_Ada
Ada
1,138
ads
with GL.Objects.Programs; with E3GA; with Multivectors; use Multivectors; package Draw_1_1 is function Draw_Circle (Render_Program : GL.Objects.Programs.Program; C1, C2, C3 : Normalized_Point) return Circle; function Draw_Line (Render_Program : GL.Objects.Programs.Program; P1, P2 : Normalized_Point) return Line; procedure Draw_Plane (Render_Program : GL.Objects.Programs.Program; DP : Dual_Plane); procedure Draw_Reflected_Circle (Render_Program : GL.Objects.Programs.Program; C : Circle; DP : Dual_Plane); procedure Draw_Reflected_Line (Render_Program : GL.Objects.Programs.Program; L : Line; DP : Dual_Plane); function Draw_Rotated_Circle (Render_Program : GL.Objects.Programs.Program; C : Circle; RV : TR_Versor) return Circle; function New_Dual_Plane (P1 : Normalized_Point; Normal : E3GA.E3_Vector) return Dual_Plane; function New_TR_Versor (L1 : Line) return TR_Versor; end Draw_1_1;
io7m/coreland-vector-ada
Ada
523
ads
generic package vector.add_scalar is -- add 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); -- add 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.add_scalar;
ekoeppen/STM32_Generic_Ada_Drivers
Ada
2,652
ads
-- This spec has been automatically generated from STM32L0x1.svd -- Definition of the device's interrupts package STM32_SVD.Interrupts is pragma Preelaborate; ---------------- -- Interrupts -- ---------------- -- Window Watchdog interrupt WWDG : constant := 0; -- PVD through EXTI line detection PVD : constant := 1; -- RTC global interrupt RTC : constant := 2; -- Flash global interrupt FLASH : constant := 3; -- RCC global interrupt RCC : constant := 4; -- EXTI Line[1:0] interrupts EXTI0_1 : constant := 5; -- EXTI Line[3:2] interrupts EXTI2_3 : constant := 6; -- EXTI Line15 and EXTI4 interrupts EXTI4_15 : constant := 7; -- DMA1 Channel1 global interrupt DMA1_Channel1 : constant := 9; -- DMA1 Channel2 and 3 interrupts DMA1_Channel2_3 : constant := 10; -- DMA1 Channel4 to 7 interrupts DMA1_Channel4_7 : constant := 11; -- ADC and comparator 1 and 2 ADC_COMP : constant := 12; -- LPTIMER1 interrupt through EXTI29 LPTIM1 : constant := 13; -- USART4/USART5 global interrupt USART4_USART5 : constant := 14; -- TIM2 global interrupt TIM2 : constant := 15; -- TIM3 global interrupt TIM3 : constant := 16; -- TIM6 global interrupt and DAC TIM6 : constant := 17; -- TIM7 global interrupt and DAC TIM7 : constant := 18; -- TIMER21 global interrupt TIM21 : constant := 20; -- I2C3 global interrupt I2C3 : constant := 21; -- TIMER22 global interrupt TIM22 : constant := 22; -- I2C1 global interrupt I2C1 : constant := 23; -- I2C2 global interrupt I2C2 : constant := 24; -- SPI1_global_interrupt SPI1 : constant := 25; -- SPI2 global interrupt SPI2 : constant := 26; -- USART1 global interrupt USART1 : constant := 27; -- USART2 global interrupt USART2 : constant := 28; -- AES global interrupt RNG global interrupt and LPUART1 global interrupt -- through AES_RNG_LPUART1 : constant := 29; Number_Of_Interrupts : constant := 29; end STM32_SVD.Interrupts;
stcarrez/ada-awa
Ada
6,362
ads
----------------------------------------------------------------------- -- awa-counters-beans -- Counter bean definition -- Copyright (C) 2015, 2016, 2020 Stephane Carrez -- Written by Stephane Carrez ([email protected]) -- -- Licensed under the Apache License, Version 2.0 (the "License"); -- you may not use this file except in compliance with the License. -- You may obtain a copy of the License at -- -- http://www.apache.org/licenses/LICENSE-2.0 -- -- Unless required by applicable law or agreed to in writing, software -- distributed under the License is distributed on an "AS IS" BASIS, -- WITHOUT WARRANTIES OR CONDITIONS OF ANY KIND, either express or implied. -- See the License for the specific language governing permissions and -- limitations under the License. ----------------------------------------------------------------------- with Ada.Strings.Unbounded; with ADO.Objects; with ADO.Schemas; with ADO.Queries; with Util.Beans.Objects; with Util.Beans.Basic; with AWA.Counters.Modules; with AWA.Counters.Models; -- == Ada Bean == -- The `Counter_Bean` allows to represent a counter associated with some database -- entity and allows its control by the `<awa:counter>` HTML component. -- To use it, an instance of the `Counter_Bean` should be defined in a another -- Ada bean declaration and configured. For example, it may be declared -- as follows: -- -- type Wiki_View_Bean is new AWA.Wikis.Models.Wiki_View_Info -- with record -- ... -- Counter : aliased Counter_Bean -- (Of_Type => ADO.Objects.KEY_INTEGER, -- Of_Class => AWA.Wikis.Models.WIKI_PAGE_TABLE); -- end record; -- -- The counter value is held by the `Value` member of `Counter_Bean` and -- it should be initialized programatically when the Ada bean instance -- is loaded (for example through a `load` action). -- The `Counter_Bean` needs to know the database entity to which it -- is associated and its `Object` member must be initialized. -- This is necessary for the `<awa:counter>` HTML component to increment -- the associated counter when the page is displayed. -- Below is an extract of such initialization: -- -- procedure Load -- (Bean : in out Wiki_View_Bean; -- Outcome : in out Ada.Strings.Unbounded.Unbounded_String) is -- begin -- ... -- Bean.Counter.Value := Bean.Get_Read_Count; -- ADO.Objects.Set_Value (Bean.Counter.Object, Bean.Get_Id); -- end Load; -- -- -- The `Stat_List_Bean` allows to retrieve the list of counters per day for -- a given database entity. It needs a special managed bean configuration -- that describes the database entity type, the counter name and -- SQL query name. -- -- The example below from the [Wikis Module] declares the bean -- `wikiPageStats`. The database entity is `awa_wiki_page` which is the -- name of the database table that holds wiki page. The SQL query -- to retrieve the result is `page-access-stats`. -- -- <managed-bean> -- <description>The counter statistics for a wiki page</description> -- <managed-bean-name>wikiPageStats</managed-bean-name> -- <managed-bean-class>AWA.Counters.Beans.Stat_List_Bean</managed-bean-class> -- <managed-bean-scope>request</managed-bean-scope> -- <managed-property> -- <property-name>entity_type</property-name> -- <property-class>String</property-class> -- <value>awa_wiki_page</value> -- </managed-property> -- <managed-property> -- <property-name>counter_name</property-name> -- <property-class>String</property-class> -- <value>read_count</value> -- </managed-property> -- <managed-property> -- <property-name>query_name</property-name> -- <property-class>String</property-class> -- <value>page-access-stats</value> -- </managed-property> -- </managed-bean> -- -- A typical XHTML view that wants to use such bean, should call the `load` -- action at beginning to load the counter statistics by running the SQL -- query. -- -- <f:view contentType="application/json; charset=UTF-8" -- xmlns:f="http://java.sun.com/jsf/core" -- xmlns:h="http://java.sun.com/jsf/html"> -- <f:metadata> -- <f:viewAction action='#{wikiPageStats.load}'/> -- </f:metadata> -- {"data":[<h:list value="#{wikiPageStats.stats}" -- var="stat">["#{stat.date}", #{stat.count}],</h:list>[0,0]]} -- </f:view> -- package AWA.Counters.Beans is type Counter_Bean (Of_Type : ADO.Objects.Object_Key_Type; Of_Class : ADO.Schemas.Class_Mapping_Access) is new Util.Beans.Basic.Readonly_Bean with record Counter : Counter_Index_Type; Value : Integer := -1; Object : ADO.Objects.Object_Key (Of_Type, Of_Class); end record; type Counter_Bean_Access is access all Counter_Bean'Class; -- Get the value identified by the name. overriding function Get_Value (From : in Counter_Bean; Name : in String) return Util.Beans.Objects.Object; type Counter_Stat_Bean is new AWA.Counters.Models.Stat_List_Bean with record Module : AWA.Counters.Modules.Counter_Module_Access; Stats : aliased AWA.Counters.Models.Stat_Info_List_Bean; Stats_Bean : AWA.Counters.Models.Stat_Info_List_Bean_Access; end record; type Counter_Stat_Bean_Access is access all Counter_Stat_Bean'Class; -- Get the query definition to collect the counter statistics. function Get_Query (From : in Counter_Stat_Bean) return ADO.Queries.Query_Definition_Access; overriding function Get_Value (List : in Counter_Stat_Bean; Name : in String) return Util.Beans.Objects.Object; -- Set the value identified by the name. overriding procedure Set_Value (From : in out Counter_Stat_Bean; Name : in String; Value : in Util.Beans.Objects.Object); -- Load the statistics information. overriding procedure Load (List : in out Counter_Stat_Bean; Outcome : in out Ada.Strings.Unbounded.Unbounded_String); -- Create the Blog_Stat_Bean bean instance. function Create_Counter_Stat_Bean (Module : in Modules.Counter_Module_Access) return Util.Beans.Basic.Readonly_Bean_Access; end AWA.Counters.Beans;
reznikmm/matreshka
Ada
5,002
ads
------------------------------------------------------------------------------ -- -- -- Matreshka Project -- -- -- -- Localization, Internationalization, Globalization for Ada -- -- -- -- Tools Component -- -- -- ------------------------------------------------------------------------------ -- -- -- Copyright © 2010, Vadim Godunko <[email protected]> -- -- All rights reserved. -- -- -- -- Redistribution and use in source and binary forms, with or without -- -- modification, are permitted provided that the following conditions -- -- are met: -- -- -- -- * Redistributions of source code must retain the above copyright -- -- notice, this list of conditions and the following disclaimer. -- -- -- -- * Redistributions in binary form must reproduce the above copyright -- -- notice, this list of conditions and the following disclaimer in the -- -- documentation and/or other materials provided with the distribution. -- -- -- -- * Neither the name of the Vadim Godunko, IE nor the names of its -- -- contributors may be used to endorse or promote products derived from -- -- this software without specific prior written permission. -- -- -- -- THIS SOFTWARE IS PROVIDED BY THE COPYRIGHT HOLDERS AND CONTRIBUTORS -- -- "AS IS" AND ANY EXPRESS OR IMPLIED WARRANTIES, INCLUDING, BUT NOT -- -- LIMITED TO, THE IMPLIED WARRANTIES OF MERCHANTABILITY AND FITNESS FOR -- -- A PARTICULAR PURPOSE ARE DISCLAIMED. IN NO EVENT SHALL THE COPYRIGHT -- -- HOLDER OR CONTRIBUTORS BE LIABLE FOR ANY DIRECT, INDIRECT, INCIDENTAL, -- -- SPECIAL, EXEMPLARY, OR CONSEQUENTIAL DAMAGES (INCLUDING, BUT NOT LIMITED -- -- TO, PROCUREMENT OF SUBSTITUTE GOODS OR SERVICES; LOSS OF USE, DATA, OR -- -- PROFITS; OR BUSINESS INTERRUPTION) HOWEVER CAUSED AND ON ANY THEORY OF -- -- LIABILITY, WHETHER IN CONTRACT, STRICT LIABILITY, OR TORT (INCLUDING -- -- NEGLIGENCE OR OTHERWISE) ARISING IN ANY WAY OUT OF THE USE OF THIS -- -- SOFTWARE, EVEN IF ADVISED OF THE POSSIBILITY OF SUCH DAMAGE. -- -- -- ------------------------------------------------------------------------------ -- $Revision$ $Date$ ------------------------------------------------------------------------------ with Ada.Containers.Vectors; with Ada.Strings.Wide_Unbounded; with Asis; package Parser_Extractor is package Unbounded_Wide_String_Vectors is new Ada.Containers.Vectors (Positive, Ada.Strings.Wide_Unbounded.Unbounded_Wide_String, Ada.Strings.Wide_Unbounded."="); type Choice_Information (Is_Empty : Boolean := True) is record case Is_Empty is when True => null; when False => Choice : Positive; Line : Positive; File : Ada.Strings.Wide_Unbounded.Unbounded_Wide_String; Text : Unbounded_Wide_String_Vectors.Vector; end case; end record; package Choice_Vectors is new Ada.Containers.Vectors (Positive, Choice_Information); type Pair is record First : Integer; Second : Integer; end record; subtype Pairs_Index is Integer range -1 .. Integer'Last; package Pair_Vectors is new Ada.Containers.Vectors (Pairs_Index, Pair); package Integer_Vectors is new Ada.Containers.Vectors (Natural, Integer); YY_Goto_Matrix : Pair_Vectors.Vector; YY_Goto_Offset : Integer_Vectors.Vector; YY_Rule_Length : Integer_Vectors.Vector; YY_Get_LHS_Rule : Integer_Vectors.Vector; YY_Shift_Reduce_Matrix : Pair_Vectors.Vector; YY_Shift_Reduce_Offset : Integer_Vectors.Vector; YY_Default : Integer; YY_First_Shift_Entry : Integer; YY_Accept_Code : Integer; YY_Error_Code : Integer; Choices : Choice_Vectors.Vector; procedure Extract (Element : Asis.Element); end Parser_Extractor;
Fabien-Chouteau/motherlode
Ada
4,802
adb
-- Motherlode -- Copyright (c) 2020 Fabien Chouteau with HAL; use HAL; with PyGamer; use PyGamer; with PyGamer.Time; with PyGamer.Controls; with PyGamer.Screen; with Parameters; with Render; with World; with Player; with Sound; package body Cargo_Menu is use type World.Valuable_Cell; Selected : World.Valuable_Cell := World.Valuable_Cell'First; ----------------- -- Draw_Screen -- ----------------- procedure Draw_Screen (FB : in out HAL.UInt16_Array) is Cargo_X_Offset : constant Natural := 0; Cargo_Y_Offest : Natural := 0; W_Column : constant Natural := Screen.Width - 1; V_Column : constant Natural := W_Column - 8 * 8; Q_Column : constant Natural := V_Column - 7 * 8; begin FB := (others => 0); Render.Draw_String_Left (FB, "Qty", X => Q_Column, Y => Cargo_Y_Offest + 4); Render.Draw_String_Left (FB, "Value", X => V_Column, Y => Cargo_Y_Offest + 4); Render.Draw_String_Left (FB, "Weight", X => W_Column, Y => Cargo_Y_Offest + 4); Cargo_Y_Offest := Cargo_Y_Offest + 20; for Kind in World.Valuable_Cell loop declare Qty : constant Natural := Player.Quantity (Kind); Value : constant Natural := Qty * Parameters.Value (Kind); Weight : constant Natural := Qty * Parameters.Weight (Kind); begin Render.Draw_Cell (FB, Cargo_X_Offset, Cargo_Y_Offest, Kind); Render.Draw_String_Left (FB => FB, Str => Integer'Image (Qty), X => Q_Column, Y => Cargo_Y_Offest + 4); Render.Draw_String_Left (FB => FB, Str => Integer'Image (Value), X => V_Column, Y => Cargo_Y_Offest + 4); Render.Draw_String_Left (FB => FB, Str => Integer'Image (Weight), X => W_Column, Y => Cargo_Y_Offest + 4); end; if Selected = Kind then Render.Draw_H_Line (FB, Cargo_X_Offset, Cargo_Y_Offest, Len => Screen.Width - Cargo_X_Offset - 1, Color => UInt16'Last); Render.Draw_H_Line (FB, Cargo_X_Offset, Cargo_Y_Offest + World.Cell_Size, Len => Screen.Width - Cargo_X_Offset - 1, Color => UInt16'Last); end if; Cargo_Y_Offest := Cargo_Y_Offest + 20; end loop; Render.Draw_String (FB => FB, Str => "Press A to drop", X => 0, Y => Cargo_Y_Offest + 4); Render.Draw_String (FB => FB, Str => "Press Select to exit", X => 0, Y => Cargo_Y_Offest + 4 + 16); end Draw_Screen; --------- -- Run -- --------- procedure Run is Period : constant Time.Time_Ms := Parameters.Frame_Period; Next_Release : Time.Time_Ms; begin Next_Release := Time.Clock; loop Controls.Scan; if Controls.Falling (Controls.Sel) then return; end if; if Controls.Falling (Controls.A) then Player.Drop (Selected); end if; if Controls.Falling (Controls.Down) then if Selected = World.Valuable_Cell'Last then Selected := World.Valuable_Cell'First; else Selected := World.Valuable_Cell'Succ (Selected); end if; elsif Controls.Falling (Controls.Up) then if Selected = World.Valuable_Cell'First then Selected := World.Valuable_Cell'Last; else Selected := World.Valuable_Cell'Pred (Selected); end if; end if; if Render.Flip then Render.Refresh_Screen (Render.FB1'Access); Draw_Screen (Render.FB2); else Render.Refresh_Screen (Render.FB2'Access); Draw_Screen (Render.FB1); end if; Render.Flip := not Render.Flip; Sound.Tick; Time.Delay_Until (Next_Release); Next_Release := Next_Release + Period; end loop; end Run; end Cargo_Menu;
reznikmm/matreshka
Ada
4,001
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.Dr3d_Shade_Mode_Attributes; package Matreshka.ODF_Dr3d.Shade_Mode_Attributes is type Dr3d_Shade_Mode_Attribute_Node is new Matreshka.ODF_Dr3d.Abstract_Dr3d_Attribute_Node and ODF.DOM.Dr3d_Shade_Mode_Attributes.ODF_Dr3d_Shade_Mode_Attribute with null record; overriding function Create (Parameters : not null access Matreshka.DOM_Attributes.Attribute_L2_Parameters) return Dr3d_Shade_Mode_Attribute_Node; overriding function Get_Local_Name (Self : not null access constant Dr3d_Shade_Mode_Attribute_Node) return League.Strings.Universal_String; end Matreshka.ODF_Dr3d.Shade_Mode_Attributes;
msrLi/portingSources
Ada
921
adb
-- Copyright 2007-2014 Free Software Foundation, Inc. -- -- This program is free software; you can redistribute it and/or modify -- it under the terms of the GNU General Public License as published by -- the Free Software Foundation; either version 3 of the License, or -- (at your option) any later version. -- -- This program is distributed in the hope that it will be useful, -- but WITHOUT ANY WARRANTY; without even the implied warranty of -- MERCHANTABILITY or FITNESS FOR A PARTICULAR PURPOSE. See the -- GNU General Public License for more details. -- -- You should have received a copy of the GNU General Public License -- along with this program. If not, see <http://www.gnu.org/licenses/>. with Pck; use Pck; procedure Foo is I : Integer := 1; begin Call_Me (Int => 1, Flt => 2.0, Bln => True, Ary => (1, 4, 8), Chr => 'j', Sad => I'Address, Rec => (A => 3, B => 7)); end Foo;
onox/orka
Ada
879
ads
-- SPDX-License-Identifier: Apache-2.0 -- -- Copyright (c) 2016 onox <[email protected]> -- -- Licensed under the Apache License, Version 2.0 (the "License"); -- you may not use this file except in compliance with the License. -- You may obtain a copy of the License at -- -- http://www.apache.org/licenses/LICENSE-2.0 -- -- Unless required by applicable law or agreed to in writing, software -- distributed under the License is distributed on an "AS IS" BASIS, -- WITHOUT WARRANTIES OR CONDITIONS OF ANY KIND, either express or implied. -- See the License for the specific language governing permissions and -- limitations under the License. with Orka.Resources.Loaders; with Orka.Resources.Managers; package Orka.Resources.Models.glTF is function Create_Loader (Manager : Managers.Manager_Ptr) return Loaders.Loader_Ptr; end Orka.Resources.Models.glTF;
AdaCore/libadalang
Ada
120
adb
with Pkg.Priv; package body Pkg is function Get return Integer is begin return Priv.Y; end Get; end Pkg;
AdaCore/libadalang
Ada
636
ads
package Test is package Pack is G_count : Integer; end Pack; type T is tagged null record; function F (Dummy : T; Unused : Integer) return Boolean; procedure Pr1 (X : in out T; Y : Integer) with Test_Case => (Name => "Pr test 1", Mode => Nominal, Requires => X.F (30) = False, Ensures => X.F (30)'Old = X.F (20) and then Test.Pack.G_count'Old > 0 and then Y'Old > Y); function Pr2 (X : String) return String with Test_Case => ("Example", Nominal); end Test; pragma Test_Block;
reznikmm/matreshka
Ada
5,262
ads
------------------------------------------------------------------------------ -- -- -- Matreshka Project -- -- -- -- Ada Modeling Framework -- -- -- -- Runtime Library Component -- -- -- ------------------------------------------------------------------------------ -- -- -- Copyright © 2011-2012, Vadim Godunko <[email protected]> -- -- All rights reserved. -- -- -- -- Redistribution and use in source and binary forms, with or without -- -- modification, are permitted provided that the following conditions -- -- are met: -- -- -- -- * Redistributions of source code must retain the above copyright -- -- notice, this list of conditions and the following disclaimer. -- -- -- -- * Redistributions in binary form must reproduce the above copyright -- -- notice, this list of conditions and the following disclaimer in the -- -- documentation and/or other materials provided with the distribution. -- -- -- -- * Neither the name of the Vadim Godunko, IE nor the names of its -- -- contributors may be used to endorse or promote products derived from -- -- this software without specific prior written permission. -- -- -- -- THIS SOFTWARE IS PROVIDED BY THE COPYRIGHT HOLDERS AND CONTRIBUTORS -- -- "AS IS" AND ANY EXPRESS OR IMPLIED WARRANTIES, INCLUDING, BUT NOT -- -- LIMITED TO, THE IMPLIED WARRANTIES OF MERCHANTABILITY AND FITNESS FOR -- -- A PARTICULAR PURPOSE ARE DISCLAIMED. IN NO EVENT SHALL THE COPYRIGHT -- -- HOLDER OR CONTRIBUTORS BE LIABLE FOR ANY DIRECT, INDIRECT, INCIDENTAL, -- -- SPECIAL, EXEMPLARY, OR CONSEQUENTIAL DAMAGES (INCLUDING, BUT NOT LIMITED -- -- TO, PROCUREMENT OF SUBSTITUTE GOODS OR SERVICES; LOSS OF USE, DATA, OR -- -- PROFITS; OR BUSINESS INTERRUPTION) HOWEVER CAUSED AND ON ANY THEORY OF -- -- LIABILITY, WHETHER IN CONTRACT, STRICT LIABILITY, OR TORT (INCLUDING -- -- NEGLIGENCE OR OTHERWISE) ARISING IN ANY WAY OUT OF THE USE OF THIS -- -- SOFTWARE, EVEN IF ADVISED OF THE POSSIBILITY OF SUCH DAMAGE. -- -- -- ------------------------------------------------------------------------------ -- $Revision$ $Date$ ------------------------------------------------------------------------------ -- This file is generated, don't edit it. ------------------------------------------------------------------------------ with AMF.Generic_Collections; package AMF.UML.Accept_Event_Actions.Collections is pragma Preelaborate; package UML_Accept_Event_Action_Collections is new AMF.Generic_Collections (UML_Accept_Event_Action, UML_Accept_Event_Action_Access); type Set_Of_UML_Accept_Event_Action is new UML_Accept_Event_Action_Collections.Set with null record; Empty_Set_Of_UML_Accept_Event_Action : constant Set_Of_UML_Accept_Event_Action; type Ordered_Set_Of_UML_Accept_Event_Action is new UML_Accept_Event_Action_Collections.Ordered_Set with null record; Empty_Ordered_Set_Of_UML_Accept_Event_Action : constant Ordered_Set_Of_UML_Accept_Event_Action; type Bag_Of_UML_Accept_Event_Action is new UML_Accept_Event_Action_Collections.Bag with null record; Empty_Bag_Of_UML_Accept_Event_Action : constant Bag_Of_UML_Accept_Event_Action; type Sequence_Of_UML_Accept_Event_Action is new UML_Accept_Event_Action_Collections.Sequence with null record; Empty_Sequence_Of_UML_Accept_Event_Action : constant Sequence_Of_UML_Accept_Event_Action; private Empty_Set_Of_UML_Accept_Event_Action : constant Set_Of_UML_Accept_Event_Action := (UML_Accept_Event_Action_Collections.Set with null record); Empty_Ordered_Set_Of_UML_Accept_Event_Action : constant Ordered_Set_Of_UML_Accept_Event_Action := (UML_Accept_Event_Action_Collections.Ordered_Set with null record); Empty_Bag_Of_UML_Accept_Event_Action : constant Bag_Of_UML_Accept_Event_Action := (UML_Accept_Event_Action_Collections.Bag with null record); Empty_Sequence_Of_UML_Accept_Event_Action : constant Sequence_Of_UML_Accept_Event_Action := (UML_Accept_Event_Action_Collections.Sequence with null record); end AMF.UML.Accept_Event_Actions.Collections;
persan/A-gst
Ada
8,275
ads
pragma Ada_2005; pragma Style_Checks (Off); pragma Warnings (Off); with Interfaces.C; use Interfaces.C; with GStreamer.GST_Low_Level.gstreamer_0_10_gst_gstclock_h; with glib; with glib.Values; with System; with GStreamer.GST_Low_Level.gstreamer_0_10_gst_gstsystemclock_h; with glib; package GStreamer.GST_Low_Level.gstreamer_0_10_gst_audio_gstaudioclock_h is -- unsupported macro: GST_TYPE_AUDIO_CLOCK (gst_audio_clock_get_type()) -- arg-macro: function GST_AUDIO_CLOCK (obj) -- return G_TYPE_CHECK_INSTANCE_CAST((obj),GST_TYPE_AUDIO_CLOCK,GstAudioClock); -- arg-macro: function GST_AUDIO_CLOCK_CLASS (klass) -- return G_TYPE_CHECK_CLASS_CAST((klass),GST_TYPE_AUDIO_CLOCK,GstAudioClockClass); -- arg-macro: function GST_IS_AUDIO_CLOCK (obj) -- return G_TYPE_CHECK_INSTANCE_TYPE((obj),GST_TYPE_AUDIO_CLOCK); -- arg-macro: function GST_IS_AUDIO_CLOCK_CLASS (klass) -- return G_TYPE_CHECK_CLASS_TYPE((klass),GST_TYPE_AUDIO_CLOCK); -- arg-macro: function GST_AUDIO_CLOCK_CAST (obj) -- return (GstAudioClock*)(obj); -- GStreamer -- * Copyright (C) 1999,2000 Erik Walthinsen <[email protected]> -- * 2005 Wim Taymans <[email protected]> -- * -- * gstaudioclock.h: Clock for use by audio plugins -- * -- * This library is free software; you can redistribute it and/or -- * modify it under the terms of the GNU Library General Public -- * License as published by the Free Software Foundation; either -- * version 2 of the License, or (at your option) any later version. -- * -- * This library is distributed in the hope that it will be useful, -- * but WITHOUT ANY WARRANTY; without even the implied warranty of -- * MERCHANTABILITY or FITNESS FOR A PARTICULAR PURPOSE. See the GNU -- * Library General Public License for more details. -- * -- * You should have received a copy of the GNU Library General Public -- * License along with this library; if not, write to the -- * Free Software Foundation, Inc., 59 Temple Place - Suite 330, -- * Boston, MA 02111-1307, USA. -- type GstAudioClock; type anon_351; type anon_352 is record time_offset : aliased GStreamer.GST_Low_Level.gstreamer_0_10_gst_gstclock_h.GstClockTimeDiff; -- gst/audio/gstaudioclock.h:78 destroy_notify : GStreamer.GST_Low_Level.glib_2_0_glib_gtypes_h.GDestroyNotify; -- gst/audio/gstaudioclock.h:79 end record; pragma Convention (C_Pass_By_Copy, anon_352); type u_GstAudioClock_u_gst_reserved_array is array (0 .. 3) of System.Address; type anon_351 (discr : unsigned := 0) is record case discr is when 0 => ABI : aliased anon_352; -- gst/audio/gstaudioclock.h:80 when others => u_gst_reserved : u_GstAudioClock_u_gst_reserved_array; -- gst/audio/gstaudioclock.h:82 end case; end record; pragma Convention (C_Pass_By_Copy, anon_351); pragma Unchecked_Union (anon_351);--subtype GstAudioClock is u_GstAudioClock; -- gst/audio/gstaudioclock.h:44 type GstAudioClockClass; type u_GstAudioClockClass_u_gst_reserved_array is array (0 .. 3) of System.Address; --subtype GstAudioClockClass is u_GstAudioClockClass; -- gst/audio/gstaudioclock.h:45 --* -- * GstAudioClockGetTimeFunc: -- * @clock: the #GstAudioClock -- * @user_data: user data -- * -- * This function will be called whenever the current clock time needs to be -- * calculated. If this function returns #GST_CLOCK_TIME_NONE, the last reported -- * time will be returned by the clock. -- * -- * Returns: the current time or #GST_CLOCK_TIME_NONE if the previous time should -- * be used. -- type GstAudioClockGetTimeFunc is access function (arg1 : access GStreamer.GST_Low_Level.gstreamer_0_10_gst_gstclock_h.GstClock; arg2 : System.Address) return GStreamer.GST_Low_Level.gstreamer_0_10_gst_gstclock_h.GstClockTime; pragma Convention (C, GstAudioClockGetTimeFunc); -- gst/audio/gstaudioclock.h:59 --* -- * GstAudioClock: -- * -- * Opaque #GstAudioClock. -- type GstAudioClock is record clock : aliased GStreamer.GST_Low_Level.gstreamer_0_10_gst_gstsystemclock_h.GstSystemClock; -- gst/audio/gstaudioclock.h:67 func : GstAudioClockGetTimeFunc; -- gst/audio/gstaudioclock.h:70 user_data : System.Address; -- gst/audio/gstaudioclock.h:71 last_time : aliased GStreamer.GST_Low_Level.gstreamer_0_10_gst_gstclock_h.GstClockTime; -- gst/audio/gstaudioclock.h:73 abidata : aliased anon_351; -- gst/audio/gstaudioclock.h:83 end record; pragma Convention (C_Pass_By_Copy, GstAudioClock); -- gst/audio/gstaudioclock.h:66 --< protected > --< private > -- adding + 0 to mark ABI change to be undone later -- GStreamer -- * Copyright (C) 1999,2000 Erik Walthinsen <[email protected]> -- * 2005 Wim Taymans <[email protected]> -- * -- * gstaudioclock.h: Clock for use by audio plugins -- * -- * This library is free software; you can redistribute it and/or -- * modify it under the terms of the GNU Library General Public -- * License as published by the Free Software Foundation; either -- * version 2 of the License, or (at your option) any later version. -- * -- * This library is distributed in the hope that it will be useful, -- * but WITHOUT ANY WARRANTY; without even the implied warranty of -- * MERCHANTABILITY or FITNESS FOR A PARTICULAR PURPOSE. See the GNU -- * Library General Public License for more details. -- * -- * You should have received a copy of the GNU Library General Public -- * License along with this library; if not, write to the -- * Free Software Foundation, Inc., 59 Temple Place - Suite 330, -- * Boston, MA 02111-1307, USA. -- type GstAudioClockClass is record parent_class : aliased GStreamer.GST_Low_Level.gstreamer_0_10_gst_gstsystemclock_h.GstSystemClockClass; -- gst/audio/gstaudioclock.h:87 u_gst_reserved : u_GstAudioClockClass_u_gst_reserved_array; -- gst/audio/gstaudioclock.h:90 end record; pragma Convention (C_Pass_By_Copy, GstAudioClockClass); -- gst/audio/gstaudioclock.h:86 function gst_audio_clock_get_type return GLIB.GType; -- gst/audio/gstaudioclock.h:93 pragma Import (C, gst_audio_clock_get_type, "gst_audio_clock_get_type"); function gst_audio_clock_new (name : access GLIB.gchar; func : GstAudioClockGetTimeFunc; user_data : System.Address) return access GStreamer.GST_Low_Level.gstreamer_0_10_gst_gstclock_h.GstClock; -- gst/audio/gstaudioclock.h:94 pragma Import (C, gst_audio_clock_new, "gst_audio_clock_new"); function gst_audio_clock_new_full (name : access GLIB.gchar; func : GstAudioClockGetTimeFunc; user_data : System.Address; destroy_notify : GStreamer.GST_Low_Level.glib_2_0_glib_gtypes_h.GDestroyNotify) return access GStreamer.GST_Low_Level.gstreamer_0_10_gst_gstclock_h.GstClock; -- gst/audio/gstaudioclock.h:96 pragma Import (C, gst_audio_clock_new_full, "gst_audio_clock_new_full"); procedure gst_audio_clock_reset (clock : access GstAudioClock; time : GStreamer.GST_Low_Level.gstreamer_0_10_gst_gstclock_h.GstClockTime); -- gst/audio/gstaudioclock.h:98 pragma Import (C, gst_audio_clock_reset, "gst_audio_clock_reset"); function gst_audio_clock_get_time (clock : access GStreamer.GST_Low_Level.gstreamer_0_10_gst_gstclock_h.GstClock) return GStreamer.GST_Low_Level.gstreamer_0_10_gst_gstclock_h.GstClockTime; -- gst/audio/gstaudioclock.h:100 pragma Import (C, gst_audio_clock_get_time, "gst_audio_clock_get_time"); function gst_audio_clock_adjust (clock : access GStreamer.GST_Low_Level.gstreamer_0_10_gst_gstclock_h.GstClock; time : GStreamer.GST_Low_Level.gstreamer_0_10_gst_gstclock_h.GstClockTime) return GStreamer.GST_Low_Level.gstreamer_0_10_gst_gstclock_h.GstClockTime; -- gst/audio/gstaudioclock.h:101 pragma Import (C, gst_audio_clock_adjust, "gst_audio_clock_adjust"); procedure gst_audio_clock_invalidate (clock : access GStreamer.GST_Low_Level.gstreamer_0_10_gst_gstclock_h.GstClock); -- gst/audio/gstaudioclock.h:103 pragma Import (C, gst_audio_clock_invalidate, "gst_audio_clock_invalidate"); end GStreamer.GST_Low_Level.gstreamer_0_10_gst_audio_gstaudioclock_h;
charlie5/lace
Ada
2,725
ads
with openGL.Texture, freetype_c.FT_GlyphSlot; private with openGL.Geometry.lit_textured, openGL.Primitive.indexed, GL; package openGL.GlyphImpl.texture -- -- Implements a texture-based glyph. -- is type Item is new GlyphImpl.item with private; type View is access all Item'Class; --------- -- Types -- type Vertex is record Site : Vector_3; Coords : Coordinate_2D; end record; type Quad_t is record NW, NE, SW, SE : Vertex; Advance : Vector_3; end record; --------- -- Forge -- function new_GlyphImpl (glyth_Slot : in freetype_c.FT_GlyphSlot.item; texture_Id : in openGL.Texture.texture_Name; xOffset, yOffset : in Integer; Width, Height : in Integer) return GlyphImpl.texture.view; -- -- glyth_Slot: The Freetype glyph to be processed. -- texture_Id: The Id of the texture that this glyph will be drawn in. -- xOffset, yOffset: The x any y offset into the parent texture to draw this glyph. -- Width, Height: The width and height (number of rows) of the parent texture. -------------- -- Attributes -- function Quad (Self : in Item; Pen : in Vector_3) return Quad_t; -------------- -- Operations -- function renderImpl (Self : in Item; Pen : in Vector_3; renderMode : in Integer) return Vector_3; -- -- Pen: The current pen position. -- renderMode: Render mode to display. -- -- Returns the advance distance for this glyph. ------------- -- Protected - for derived class use only. -- procedure ResetActiveTexture; -- -- Reset the currently active texture to zero to get into a known -- state before drawing a string. This is to get around possible threading issues. private type Item is new GlyphImpl.item with record destWidth, -- The width and height of the glyph 'image'. destHeight : GL.GLint; Corner : Vector_3; -- Vector from the pen site to the top left of the pixmap. UV : Coordinates_2D (1 .. 2); -- The texture co-ords of this glyph within the texture. glTextureID : openGL.texture.texture_Name; -- The texture index that this glyph is contained in. Geometry : access Geometry.lit_textured.item; Primitive : openGL.Primitive.indexed.view; end record; end openGL.GlyphImpl.texture;
charlie5/lace
Ada
1,220
adb
with GL, GL.Binding, openGL.Tasks, interfaces.C; package body openGL.Renderer is use GL, interfaces.C; procedure Background_is (Self : in out Item; Now : in openGL.Color; Opacity : in Opaqueness := 1.0) is begin Self.Background.Primary := +Now; Self.Background.Alpha := to_color_Value (Primary (Opacity)); end Background_is; procedure Background_is (Self : in out Item; Now : in openGL.lucid_Color) is begin Self.Background := +Now; end Background_is; procedure clear_Frame (Self : in Item) is use GL.Binding; check_is_OK : constant Boolean := openGL.Tasks.Check with Unreferenced; begin glClearColor (GLfloat (to_Primary (Self.Background.Primary.Red)), GLfloat (to_Primary (Self.Background.Primary.Green)), GLfloat (to_Primary (Self.Background.Primary.Blue)), GLfloat (to_Primary (Self.Background.Alpha))); glClear ( GL_COLOR_BUFFER_BIT or GL_DEPTH_BUFFER_BIT); glCullFace (GL_BACK); glEnable (GL_CULL_FACE); end clear_Frame; end openGL.Renderer;
charlie5/cBound
Ada
1,500
ads
-- This file is generated by SWIG. Please do not modify by hand. -- with Interfaces.C; with Interfaces.C; with Interfaces.C.Pointers; package xcb.xcb_glx_get_histogram_parameterfv_cookie_t is -- Item -- type Item is record sequence : aliased Interfaces.C.unsigned; end record; -- Item_Array -- type Item_Array is array (Interfaces.C .size_t range <>) of aliased xcb .xcb_glx_get_histogram_parameterfv_cookie_t .Item; -- Pointer -- package C_Pointers is new Interfaces.C.Pointers (Index => Interfaces.C.size_t, Element => xcb.xcb_glx_get_histogram_parameterfv_cookie_t.Item, Element_Array => xcb.xcb_glx_get_histogram_parameterfv_cookie_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_get_histogram_parameterfv_cookie_t .Pointer; -- Pointer_Pointer -- package C_Pointer_Pointers is new Interfaces.C.Pointers (Index => Interfaces.C.size_t, Element => xcb.xcb_glx_get_histogram_parameterfv_cookie_t.Pointer, Element_Array => xcb.xcb_glx_get_histogram_parameterfv_cookie_t.Pointer_Array, Default_Terminator => null); subtype Pointer_Pointer is C_Pointer_Pointers.Pointer; end xcb.xcb_glx_get_histogram_parameterfv_cookie_t;
leonardoce/ada-iup
Ada
1,213
adb
-- The MIT License (MIT) -- -- Copyright (c) 2014, Leonardo Cecchi -- -- Permission is hereby granted, free of charge, to any person obtaining a copy -- of this software and associated documentation files (the "Software"), to deal -- in the Software without restriction, including without limitation the rights -- to use, copy, modify, merge, publish, distribute, sublicense, and/or sell -- copies of the Software, and to permit persons to whom the Software is -- furnished to do so, subject to the following conditions: -- -- The above copyright notice and this permission notice shall be included in -- all copies or substantial portions of the Software. -- -- THE SOFTWARE IS PROVIDED "AS IS", WITHOUT WARRANTY OF ANY KIND, EXPRESS OR -- IMPLIED, INCLUDING BUT NOT LIMITED TO THE WARRANTIES OF MERCHANTABILITY, -- FITNESS FOR A PARTICULAR PURPOSE AND NONINFRINGEMENT. IN NO EVENT SHALL THE -- AUTHORS OR COPYRIGHT HOLDERS BE LIABLE FOR ANY CLAIM, DAMAGES OR OTHER -- LIABILITY, WHETHER IN AN ACTION OF CONTRACT, TORT OR OTHERWISE, ARISING FROM, -- OUT OF OR IN CONNECTION WITH THE SOFTWARE OR THE USE OR OTHER DEALINGS IN -- THE SOFTWARE. with Esempio; procedure provaiup is begin Esempio.Main; end;
zenharris/ada-bbs
Ada
354
ads
with Irc.Bot; with Irc.Commands; with Irc.Message; with Ada.Strings.Unbounded; use Ada.Strings.Unbounded; with Terminal_Interface.Curses; use Terminal_Interface.Curses; with Ada.Characters.Latin_1; use Ada.Characters.Latin_1; with Texaco; with GNAT.Sockets; package Pong_Bot is Bot : Irc.Bot.Connection; procedure Irc_Client; end Pong_Bot;
zhmu/ananas
Ada
2,687
adb
------------------------------------------------------------------------------ -- -- -- GNAT LIBRARY COMPONENTS -- -- -- -- A D A . S T R I N G S . W I D E _ W I D E _ H A S H -- -- -- -- B o d y -- -- -- -- Copyright (C) 2009-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 System.String_Hash; function Ada.Strings.Wide_Wide_Hash (Key : Wide_Wide_String) return Containers.Hash_Type is use Ada.Containers; function Hash_Fun is new System.String_Hash.Hash (Wide_Wide_Character, Wide_Wide_String, Hash_Type); begin return Hash_Fun (Key); end Ada.Strings.Wide_Wide_Hash;
stcarrez/ada-util
Ada
8,674
ads
----------------------------------------------------------------------- -- util-serialize-io-csv -- CSV Serialization Driver -- Copyright (C) 2011, 2016, 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 Util.Strings.Vectors; with Util.Streams.Texts; -- The <b>Util.Serialize.IO.CSV</b> package allows to read and write CSV files. -- -- See RFC 4180 - Common Format and MIME Type for Comma-Separated Values (CSV) Files package Util.Serialize.IO.CSV is type Row_Type is new Natural; type Column_Type is new Positive; -- ------------------------------ -- CSV Output Stream -- ------------------------------ -- The <b>Output_Stream</b> provides methods for creating a CSV output stream. -- The stream object takes care of the CSV escape rules. type Output_Stream is new Util.Streams.Texts.Print_Stream and Util.Serialize.IO.Output_Stream with private; -- Set the field separator. The default field separator is the comma (','). procedure Set_Field_Separator (Stream : in out Output_Stream; Separator : in Character); -- Enable or disable the double quotes by default for strings. procedure Set_Quotes (Stream : in out Output_Stream; Enable : in Boolean); -- Write the value as a CSV cell. Special characters are escaped using the CSV -- escape rules. procedure Write_Cell (Stream : in out Output_Stream; Value : in String); procedure Write_Cell (Stream : in out Output_Stream; Value : in Integer); procedure Write_Cell (Stream : in out Output_Stream; Value : in Boolean); procedure Write_Cell (Stream : in out Output_Stream; Value : in Util.Beans.Objects.Object); -- Start a new row. procedure New_Row (Stream : in out Output_Stream); -- Write the attribute name/value pair. overriding procedure Write_Attribute (Stream : in out Output_Stream; Name : in String; Value : in String); overriding procedure Write_Wide_Attribute (Stream : in out Output_Stream; Name : in String; Value : in Wide_Wide_String); overriding procedure Write_Attribute (Stream : in out Output_Stream; Name : in String; Value : in Integer); overriding procedure Write_Attribute (Stream : in out Output_Stream; Name : in String; Value : in Boolean); overriding procedure Write_Attribute (Stream : in out Output_Stream; Name : in String; Value : in Util.Beans.Objects.Object); -- Write the attribute with a null value. overriding procedure Write_Null_Attribute (Stream : in out Output_Stream; Name : in String); -- Write the entity value. overriding procedure Write_Entity (Stream : in out Output_Stream; Name : in String; Value : in String); overriding procedure Write_Wide_Entity (Stream : in out Output_Stream; Name : in String; Value : in Wide_Wide_String); overriding procedure Write_Entity (Stream : in out Output_Stream; Name : in String; Value : in Boolean); overriding procedure Write_Entity (Stream : in out Output_Stream; Name : in String; Value : in Integer); overriding procedure Write_Entity (Stream : in out Output_Stream; Name : in String; Value : in Ada.Calendar.Time); overriding procedure Write_Long_Entity (Stream : in out Output_Stream; Name : in String; Value : in Long_Long_Integer); overriding procedure Write_Long_Entity (Stream : in out Output_Stream; Name : in String; Value : in Long_Long_Float); overriding procedure Write_Enum_Entity (Stream : in out Output_Stream; Name : in String; Value : in String); overriding procedure Write_Entity (Stream : in out Output_Stream; Name : in String; Value : in Util.Beans.Objects.Object); -- Write an entity with a null value. overriding procedure Write_Null_Entity (Stream : in out Output_Stream; Name : in String); -- ------------------------------ -- CSV Parser -- ------------------------------ -- The <b>Parser</b> type is a CSV parser which allows to map CVS rows directly -- in Ada records. type Parser is new Serialize.IO.Parser with private; -- Get the header name for the given column. -- If there was no header line, build a default header for the column. function Get_Header_Name (Handler : in Parser; Column : in Column_Type) return String; -- Set the cell value at the given row and column. -- The default implementation finds the column header name and -- invokes <b>Write_Entity</b> with the header name and the value. procedure Set_Cell (Handler : in out Parser; Value : in String; Row : in Row_Type; Column : in Column_Type); -- Set the field separator. The default field separator is the comma (','). procedure Set_Field_Separator (Handler : in out Parser; Separator : in Character); -- Get the field separator. function Get_Field_Separator (Handler : in Parser) return Character; -- Set the comment separator. When a comment separator is defined, a line which starts -- with the comment separator will be ignored. The row number will not be incremented. procedure Set_Comment_Separator (Handler : in out Parser; Separator : in Character); -- Get the comment separator. Returns ASCII.NUL if comments are not supported. function Get_Comment_Separator (Handler : in Parser) return Character; -- Setup the CSV parser and mapper to use the default column header names. -- When activated, the first row is assumed to contain the first item to de-serialize. procedure Set_Default_Headers (Handler : in out Parser; Mode : in Boolean := True); -- Parse the stream using the CSV parser. overriding procedure Parse (Handler : in out Parser; Stream : in out Util.Streams.Buffered.Input_Buffer_Stream'Class; Sink : in out Reader'Class); -- Get the current location (file and line) to report an error message. overriding function Get_Location (Handler : in Parser) return String; private type Output_Stream is new Util.Streams.Texts.Print_Stream and Util.Serialize.IO.Output_Stream with record Max_Columns : Column_Type := 1; Column : Column_Type := 1; Row : Row_Type := 0; Separator : Character := ','; Quote : Boolean := True; end record; type Parser is new Util.Serialize.IO.Parser with record Has_Header : Boolean := True; Line_Number : Natural := 1; Row : Row_Type := 0; Headers : Util.Strings.Vectors.Vector; Separator : Character := ','; Comment : Character := ASCII.NUL; Use_Default_Headers : Boolean := False; Sink : access Reader'Class; end record; end Util.Serialize.IO.CSV;
AdaCore/langkit
Ada
418
adb
with Langkit_Support.Adalog.Main_Support; use Langkit_Support.Adalog.Main_Support; -- Check that topological sort in the solver works even if a var is defined -- twice in a solution. procedure Main is use T_Solver; use Refs; X : constant Refs.Logic_Var := Create ("X"); Y : constant Refs.Logic_Var := Create ("Y"); R : constant Relation := X = X and X = 1 and Y = 1; begin Solve_All (R); end Main;
francesco-bongiovanni/ewok-kernel
Ada
1,248
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.cfg.gpio with spark_mode => off is procedure gpio_set (caller_id : in ewok.tasks_shared.t_task_id; params : in out t_parameters; mode : in ewok.tasks_shared.t_task_mode); procedure gpio_get (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.cfg.gpio;
reznikmm/matreshka
Ada
3,606
ads
------------------------------------------------------------------------------ -- -- -- Matreshka Project -- -- -- -- Ada Modeling Framework -- -- -- -- Runtime Library Component -- -- -- ------------------------------------------------------------------------------ -- -- -- Copyright © 2011-2012, Vadim Godunko <[email protected]> -- -- All rights reserved. -- -- -- -- Redistribution and use in source and binary forms, with or without -- -- modification, are permitted provided that the following conditions -- -- are met: -- -- -- -- * Redistributions of source code must retain the above copyright -- -- notice, this list of conditions and the following disclaimer. -- -- -- -- * Redistributions in binary form must reproduce the above copyright -- -- notice, this list of conditions and the following disclaimer in the -- -- documentation and/or other materials provided with the distribution. -- -- -- -- * Neither the name of the Vadim Godunko, IE nor the names of its -- -- contributors may be used to endorse or promote products derived from -- -- this software without specific prior written permission. -- -- -- -- THIS SOFTWARE IS PROVIDED BY THE COPYRIGHT HOLDERS AND CONTRIBUTORS -- -- "AS IS" AND ANY EXPRESS OR IMPLIED WARRANTIES, INCLUDING, BUT NOT -- -- LIMITED TO, THE IMPLIED WARRANTIES OF MERCHANTABILITY AND FITNESS FOR -- -- A PARTICULAR PURPOSE ARE DISCLAIMED. IN NO EVENT SHALL THE COPYRIGHT -- -- HOLDER OR CONTRIBUTORS BE LIABLE FOR ANY DIRECT, INDIRECT, INCIDENTAL, -- -- SPECIAL, EXEMPLARY, OR CONSEQUENTIAL DAMAGES (INCLUDING, BUT NOT LIMITED -- -- TO, PROCUREMENT OF SUBSTITUTE GOODS OR SERVICES; LOSS OF USE, DATA, OR -- -- PROFITS; OR BUSINESS INTERRUPTION) HOWEVER CAUSED AND ON ANY THEORY OF -- -- LIABILITY, WHETHER IN CONTRACT, STRICT LIABILITY, OR TORT (INCLUDING -- -- NEGLIGENCE OR OTHERWISE) ARISING IN ANY WAY OUT OF THE USE OF THIS -- -- SOFTWARE, EVEN IF ADVISED OF THE POSSIBILITY OF SUCH DAMAGE. -- -- -- ------------------------------------------------------------------------------ -- $Revision$ $Date$ ------------------------------------------------------------------------------ -- This file is generated, don't edit it. ------------------------------------------------------------------------------ with AMF.Elements.Generic_Hash; function AMF.UML.Transitions.Hash is new AMF.Elements.Generic_Hash (UML_Transition, UML_Transition_Access);
zhmu/ananas
Ada
2,677
adb
------------------------------------------------------------------------------ -- -- -- GNAT LIBRARY COMPONENTS -- -- -- -- G N A T . R E G P A T -- -- -- -- B o d y -- -- -- -- Copyright (C) 1986 by University of Toronto. -- -- Copyright (C) 1999-2022, AdaCore -- -- -- -- GNAT is free software; you can redistribute it and/or modify it under -- -- terms of the GNU General Public License as published by the Free Soft- -- -- ware Foundation; either version 3, or (at your option) any later ver- -- -- sion. GNAT is distributed in the hope that it will be useful, but WITH- -- -- OUT ANY WARRANTY; without even the implied warranty of MERCHANTABILITY -- -- or FITNESS FOR A PARTICULAR PURPOSE. -- -- -- -- As a special exception under Section 7 of GPL version 3, you are granted -- -- additional permissions described in the GCC Runtime Library Exception, -- -- version 3.1, as published by the Free Software Foundation. -- -- -- -- You should have received a copy of the GNU General Public License and -- -- a copy of the GCC Runtime Library Exception along with this program; -- -- see the files COPYING3 and COPYING.RUNTIME respectively. If not, see -- -- <http://www.gnu.org/licenses/>. -- -- -- -- GNAT was originally developed by the GNAT team at New York University. -- -- Extensive contributions were provided by Ada Core Technologies Inc. -- -- -- ------------------------------------------------------------------------------ -- This package does not require a body, since it is a package renaming. We -- provide a dummy file containing a No_Body pragma so that previous versions -- of the body (which did exist) will not interfere. pragma No_Body;
twdroeger/ada-awa
Ada
3,633
ads
----------------------------------------------------------------------- -- users-tests-helpers -- Helpers for user creation -- Copyright (C) 2011, 2012, 2013, 2014, 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.Finalization; with Security.Contexts; with ASF.Requests.Mockup; with AWA.Users.Models; with AWA.Users.Services; with AWA.Services.Contexts; with AWA.Users.Principals; package AWA.Tests.Helpers.Users is type Test_User is new Ada.Finalization.Limited_Controlled with record Context : AWA.Services.Contexts.Service_Context; Manager : AWA.Users.Services.User_Service_Access := null; User : AWA.Users.Models.User_Ref; Email : AWA.Users.Models.Email_Ref; Session : AWA.Users.Models.Session_Ref; Principal : AWA.Users.Principals.Principal_Access; end record; -- Initialize the service context. procedure Initialize (Principal : in out Test_User); -- Create a test user associated with the given email address. -- Get an open session for that user. If the user already exists, no error is reported. procedure Create_User (Principal : in out Test_User; Email : in String); -- Create a test user for a new test and get an open session. procedure Create_User (Principal : in out Test_User); -- Find the access key associated with a user (if any). procedure Find_Access_Key (Principal : in out Test_User; Email : in String; Key : in out AWA.Users.Models.Access_Key_Ref); -- Login a user and create a session procedure Login (Principal : in out Test_User); -- Logout the user and closes the current session. procedure Logout (Principal : in out Test_User); -- Simulate a user login in the given service context. procedure Login (Context : in out AWA.Services.Contexts.Service_Context'Class; Sec_Context : in out Security.Contexts.Security_Context; Email : in String); -- Simulate a user login on the request. Upon successful login, a session that is -- authentified is associated with the request object. procedure Login (Email : in String; Request : in out ASF.Requests.Mockup.Request); -- Setup the context and security context to simulate an anonymous user. procedure Anonymous (Context : in out AWA.Services.Contexts.Service_Context'Class; Sec_Context : in out Security.Contexts.Security_Context); -- Simulate the recovery password process for the given user. procedure Recover_Password (Email : in String); overriding procedure Finalize (Principal : in out Test_User); -- Cleanup and release the Principal that have been allocated from the Login session -- but not released because the Logout is not called from the unit test. procedure Tear_Down; end AWA.Tests.Helpers.Users;
reznikmm/matreshka
Ada
3,694
ads
------------------------------------------------------------------------------ -- -- -- Matreshka Project -- -- -- -- Open Document Toolkit -- -- -- -- Runtime Library Component -- -- -- ------------------------------------------------------------------------------ -- -- -- Copyright © 2014, Vadim Godunko <[email protected]> -- -- All rights reserved. -- -- -- -- Redistribution and use in source and binary forms, with or without -- -- modification, are permitted provided that the following conditions -- -- are met: -- -- -- -- * Redistributions of source code must retain the above copyright -- -- notice, this list of conditions and the following disclaimer. -- -- -- -- * Redistributions in binary form must reproduce the above copyright -- -- notice, this list of conditions and the following disclaimer in the -- -- documentation and/or other materials provided with the distribution. -- -- -- -- * Neither the name of the Vadim Godunko, IE nor the names of its -- -- contributors may be used to endorse or promote products derived from -- -- this software without specific prior written permission. -- -- -- -- THIS SOFTWARE IS PROVIDED BY THE COPYRIGHT HOLDERS AND CONTRIBUTORS -- -- "AS IS" AND ANY EXPRESS OR IMPLIED WARRANTIES, INCLUDING, BUT NOT -- -- LIMITED TO, THE IMPLIED WARRANTIES OF MERCHANTABILITY AND FITNESS FOR -- -- A PARTICULAR PURPOSE ARE DISCLAIMED. IN NO EVENT SHALL THE COPYRIGHT -- -- HOLDER OR CONTRIBUTORS BE LIABLE FOR ANY DIRECT, INDIRECT, INCIDENTAL, -- -- SPECIAL, EXEMPLARY, OR CONSEQUENTIAL DAMAGES (INCLUDING, BUT NOT LIMITED -- -- TO, PROCUREMENT OF SUBSTITUTE GOODS OR SERVICES; LOSS OF USE, DATA, OR -- -- PROFITS; OR BUSINESS INTERRUPTION) HOWEVER CAUSED AND ON ANY THEORY OF -- -- LIABILITY, WHETHER IN CONTRACT, STRICT LIABILITY, OR TORT (INCLUDING -- -- NEGLIGENCE OR OTHERWISE) ARISING IN ANY WAY OUT OF THE USE OF THIS -- -- SOFTWARE, EVEN IF ADVISED OF THE POSSIBILITY OF SUCH DAMAGE. -- -- -- ------------------------------------------------------------------------------ -- $Revision$ $Date$ ------------------------------------------------------------------------------ with XML.DOM.Elements; package ODF.DOM.Text_Editing_Cycles_Elements is pragma Preelaborate; type ODF_Text_Editing_Cycles is limited interface and XML.DOM.Elements.DOM_Element; type ODF_Text_Editing_Cycles_Access is access all ODF_Text_Editing_Cycles'Class with Storage_Size => 0; end ODF.DOM.Text_Editing_Cycles_Elements;
zhmu/ananas
Ada
2,681
adb
------------------------------------------------------------------------------ -- -- -- GNAT RUN-TIME COMPONENTS -- -- -- -- ADA.WIDE_WIDE_TEXT_IO.RESET_STANDARD_FILES -- -- -- -- B o d y -- -- -- -- Copyright (C) 2009-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. -- -- -- ------------------------------------------------------------------------------ ------------------------------------------------ -- Ada.Wide_Wide_Text_IO.Reset_Standard_Files -- ------------------------------------------------ procedure Ada.Wide_Wide_Text_IO.Reset_Standard_Files is begin Ada.Wide_Wide_Text_IO.Initialize_Standard_Files; end Ada.Wide_Wide_Text_IO.Reset_Standard_Files;
onox/orka
Ada
1,309
ads
-- SPDX-License-Identifier: Apache-2.0 -- -- Copyright (c) 2016 onox <[email protected]> -- -- Licensed under the Apache License, Version 2.0 (the "License"); -- you may not use this file except in compliance with the License. -- You may obtain a copy of the License at -- -- http://www.apache.org/licenses/LICENSE-2.0 -- -- Unless required by applicable law or agreed to in writing, software -- distributed under the License is distributed on an "AS IS" BASIS, -- WITHOUT WARRANTIES OR CONDITIONS OF ANY KIND, either express or implied. -- See the License for the specific language governing permissions and -- limitations under the License. package Orka.SIMD.SSE2.Doubles.Logical is pragma Pure; function And_Not (Left, Right : m128d) return m128d with Import, Convention => Intrinsic, External_Name => "__builtin_ia32_andnpd"; function "and" (Left, Right : m128d) return m128d with Import, Convention => Intrinsic, External_Name => "__builtin_ia32_andpd"; function "or" (Left, Right : m128d) return m128d with Import, Convention => Intrinsic, External_Name => "__builtin_ia32_orpd"; function "xor" (Left, Right : m128d) return m128d with Import, Convention => Intrinsic, External_Name => "__builtin_ia32_xorpd"; end Orka.SIMD.SSE2.Doubles.Logical;
reznikmm/matreshka
Ada
4,703
adb
------------------------------------------------------------------------------ -- -- -- Matreshka Project -- -- -- -- Open Document Toolkit -- -- -- -- Runtime Library Component -- -- -- ------------------------------------------------------------------------------ -- -- -- Copyright © 2014, Vadim Godunko <[email protected]> -- -- All rights reserved. -- -- -- -- Redistribution and use in source and binary forms, with or without -- -- modification, are permitted provided that the following conditions -- -- are met: -- -- -- -- * Redistributions of source code must retain the above copyright -- -- notice, this list of conditions and the following disclaimer. -- -- -- -- * Redistributions in binary form must reproduce the above copyright -- -- notice, this list of conditions and the following disclaimer in the -- -- documentation and/or other materials provided with the distribution. -- -- -- -- * Neither the name of the Vadim Godunko, IE nor the names of its -- -- contributors may be used to endorse or promote products derived from -- -- this software without specific prior written permission. -- -- -- -- THIS SOFTWARE IS PROVIDED BY THE COPYRIGHT HOLDERS AND CONTRIBUTORS -- -- "AS IS" AND ANY EXPRESS OR IMPLIED WARRANTIES, INCLUDING, BUT NOT -- -- LIMITED TO, THE IMPLIED WARRANTIES OF MERCHANTABILITY AND FITNESS FOR -- -- A PARTICULAR PURPOSE ARE DISCLAIMED. IN NO EVENT SHALL THE COPYRIGHT -- -- HOLDER OR CONTRIBUTORS BE LIABLE FOR ANY DIRECT, INDIRECT, INCIDENTAL, -- -- SPECIAL, EXEMPLARY, OR CONSEQUENTIAL DAMAGES (INCLUDING, BUT NOT LIMITED -- -- TO, PROCUREMENT OF SUBSTITUTE GOODS OR SERVICES; LOSS OF USE, DATA, OR -- -- PROFITS; OR BUSINESS INTERRUPTION) HOWEVER CAUSED AND ON ANY THEORY OF -- -- LIABILITY, WHETHER IN CONTRACT, STRICT LIABILITY, OR TORT (INCLUDING -- -- NEGLIGENCE OR OTHERWISE) ARISING IN ANY WAY OUT OF THE USE OF THIS -- -- SOFTWARE, EVEN IF ADVISED OF THE POSSIBILITY OF SUCH DAMAGE. -- -- -- ------------------------------------------------------------------------------ -- $Revision$ $Date$ ------------------------------------------------------------------------------ with Matreshka.DOM_Documents; with Matreshka.ODF_String_Constants; with ODF.DOM.Iterators; with ODF.DOM.Visitors; package body Matreshka.ODF_Draw.Handle_Range_X_Minimum_Attributes is ------------ -- Create -- ------------ overriding function Create (Parameters : not null access Matreshka.DOM_Attributes.Attribute_L2_Parameters) return Draw_Handle_Range_X_Minimum_Attribute_Node is begin return Self : Draw_Handle_Range_X_Minimum_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_Handle_Range_X_Minimum_Attribute_Node) return League.Strings.Universal_String is pragma Unreferenced (Self); begin return Matreshka.ODF_String_Constants.Handle_Range_X_Minimum_Attribute; end Get_Local_Name; begin Matreshka.DOM_Documents.Register_Attribute (Matreshka.ODF_String_Constants.Draw_URI, Matreshka.ODF_String_Constants.Handle_Range_X_Minimum_Attribute, Draw_Handle_Range_X_Minimum_Attribute_Node'Tag); end Matreshka.ODF_Draw.Handle_Range_X_Minimum_Attributes;
godunko/adawebpack
Ada
2,939
ads
------------------------------------------------------------------------------ -- -- -- AdaWebPack -- -- -- ------------------------------------------------------------------------------ -- Copyright © 2016-2020, Vadim Godunko -- -- 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. -- -- -- -- 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 Web.GL.Objects; package Web.GL.Programs is pragma Preelaborate; type WebGL_Program is new Web.GL.Objects.WebGL_Object with null record; end Web.GL.Programs;
AdaCore/langkit
Ada
3,579
adb
with Ada.Text_IO; use Ada.Text_IO; with GNATCOLL.GMP.Integers; use GNATCOLL.GMP.Integers; with Langkit_Support.Errors; use Langkit_Support.Errors; with Libfoolang.Analysis; use Libfoolang.Analysis; procedure Main is procedure Put_Title (Label : String); --------------- -- Put_Title -- --------------- procedure Put_Title (Label : String) is begin Put_Line (Label); Put_Line ((1 .. Label'Length => '#')); New_Line; end Put_Title; Ctx : constant Analysis_Context := Create_Context; U : constant Analysis_Unit := Ctx.Get_From_Buffer (Filename => "main.txt", Buffer => "example"); Ex : Example; begin Put_Line ("main.adb: Running..."); if U.Has_Diagnostics then raise Program_Error; end if; Ex := U.Root.As_Example; Put_Title ("Int iterator"); Put_Line ("Base array:"); for Elem of U.Root.As_Example.P_Int_Array loop Put_Line (" " & Elem'Image); end loop; Put_Line ("Iteration:"); declare Iter : Integer_Iterator := Ex.P_Int_Iterator; Elem : Integer; begin while Next (Iter, Elem) loop Iter := Ex.P_Int_Iterator_Identity (Iter); Put_Line (" " & Elem'Image); end loop; end; New_Line; Put_Line ("Identity on an unintialized (null) iterator..."); declare Dummy : Integer_Iterator; begin Dummy := Ex.P_Int_Iterator_Identity (Dummy); Put_Line ("... got no exception"); exception when Precondition_Failure => Put_Line ("... got a precondition failure"); end; New_Line; Put_Line ("Next on an unintialized (null) iterator..."); declare Iter : Integer_Iterator; Dummy_Int : Integer; Dummy_Bool : Boolean; begin Dummy_Bool := Next (Iter, Dummy_Int); Put_Line ("... got no exception"); exception when Precondition_Failure => Put_Line ("... got a precondition failure"); end; New_Line; Put_Line ("Identity on a stale iterator..."); declare Iter : Integer_Iterator := Ex.P_Int_Iterator; begin U.Reparse (Buffer => " example "); Ex := U.Root.As_Example; Iter := Ex.P_Int_Iterator_Identity (Iter); Put_Line ("... got no exception"); exception when Stale_Reference_Error => Put_Line ("... got a stale reference error"); end; New_Line; Put_Title ("Bigint iterator"); -- TODO (UB16-045)??? Enable this. Due to a GNAT bug, this currently runs -- invalid generated machine code. if False then Put_Line ("Base array:"); declare Items : constant Big_Integer_Array := U.Root.As_Example.P_Bigint_Array; begin for Elem of Items loop Put_Line (" " & Image (Elem)); end loop; end; end if; Put_Line ("Iteration:"); declare Iter : constant Big_Integer_Iterator := U.Root.As_Example.P_Bigint_Iterator; Elem : Big_Integer; begin while Next (Iter, Elem) loop Put_Line (" " & Image (Elem)); end loop; end; New_Line; Put_Title ("Entity iterator"); Put_Line ("Base array:"); for Elem of U.Root.As_Example.P_Entities_Array loop Put_Line (" " & Image (Elem)); end loop; Put_Line ("Iteration:"); declare Iter : constant Example_Iterator := U.Root.As_Example.P_Entities_Iterator; Elem : Example; begin while Next (Iter, Elem) loop Put_Line (" " & Image (Elem)); end loop; end; New_Line; Put_Line ("main.adb: Done."); end Main;
reznikmm/matreshka
Ada
4,630
ads
------------------------------------------------------------------------------ -- -- -- Matreshka Project -- -- -- -- Ada Modeling Framework -- -- -- -- Runtime Library Component -- -- -- ------------------------------------------------------------------------------ -- -- -- Copyright © 2011-2012, Vadim Godunko <[email protected]> -- -- All rights reserved. -- -- -- -- Redistribution and use in source and binary forms, with or without -- -- modification, are permitted provided that the following conditions -- -- are met: -- -- -- -- * Redistributions of source code must retain the above copyright -- -- notice, this list of conditions and the following disclaimer. -- -- -- -- * Redistributions in binary form must reproduce the above copyright -- -- notice, this list of conditions and the following disclaimer in the -- -- documentation and/or other materials provided with the distribution. -- -- -- -- * Neither the name of the Vadim Godunko, IE nor the names of its -- -- contributors may be used to endorse or promote products derived from -- -- this software without specific prior written permission. -- -- -- -- THIS SOFTWARE IS PROVIDED BY THE COPYRIGHT HOLDERS AND CONTRIBUTORS -- -- "AS IS" AND ANY EXPRESS OR IMPLIED WARRANTIES, INCLUDING, BUT NOT -- -- LIMITED TO, THE IMPLIED WARRANTIES OF MERCHANTABILITY AND FITNESS FOR -- -- A PARTICULAR PURPOSE ARE DISCLAIMED. IN NO EVENT SHALL THE COPYRIGHT -- -- HOLDER OR CONTRIBUTORS BE LIABLE FOR ANY DIRECT, INDIRECT, INCIDENTAL, -- -- SPECIAL, EXEMPLARY, OR CONSEQUENTIAL DAMAGES (INCLUDING, BUT NOT LIMITED -- -- TO, PROCUREMENT OF SUBSTITUTE GOODS OR SERVICES; LOSS OF USE, DATA, OR -- -- PROFITS; OR BUSINESS INTERRUPTION) HOWEVER CAUSED AND ON ANY THEORY OF -- -- LIABILITY, WHETHER IN CONTRACT, STRICT LIABILITY, OR TORT (INCLUDING -- -- NEGLIGENCE OR OTHERWISE) ARISING IN ANY WAY OUT OF THE USE OF THIS -- -- SOFTWARE, EVEN IF ADVISED OF THE POSSIBILITY OF SUCH DAMAGE. -- -- -- ------------------------------------------------------------------------------ -- $Revision$ $Date$ ------------------------------------------------------------------------------ -- This file is generated, don't edit it. ------------------------------------------------------------------------------ -- A create link object action creates a link object. ------------------------------------------------------------------------------ with AMF.UML.Create_Link_Actions; limited with AMF.UML.Output_Pins; package AMF.UML.Create_Link_Object_Actions is pragma Preelaborate; type UML_Create_Link_Object_Action is limited interface and AMF.UML.Create_Link_Actions.UML_Create_Link_Action; type UML_Create_Link_Object_Action_Access is access all UML_Create_Link_Object_Action'Class; for UML_Create_Link_Object_Action_Access'Storage_Size use 0; not overriding function Get_Result (Self : not null access constant UML_Create_Link_Object_Action) return AMF.UML.Output_Pins.UML_Output_Pin_Access is abstract; -- Getter of CreateLinkObjectAction::result. -- -- Gives the output pin on which the result is put. not overriding procedure Set_Result (Self : not null access UML_Create_Link_Object_Action; To : AMF.UML.Output_Pins.UML_Output_Pin_Access) is abstract; -- Setter of CreateLinkObjectAction::result. -- -- Gives the output pin on which the result is put. end AMF.UML.Create_Link_Object_Actions;
ekoeppen/MSP430_Generic_Ada_Drivers
Ada
1,776
ads
-- This spec has been automatically generated from msp430g2553.svd pragma Restrictions (No_Elaboration_Code); pragma Ada_2012; pragma Style_Checks (Off); with System; -- Calibration Data package MSP430_SVD.CALIBRATION_DATA is pragma Preelaborate; --------------- -- Registers -- --------------- ----------------- -- Peripherals -- ----------------- -- Calibration Data type CALIBRATION_DATA_Peripheral is record -- DCOCTL Calibration Data for 16MHz CALDCO_16MHZ : aliased MSP430_SVD.Byte; -- BCSCTL1 Calibration Data for 16MHz CALBC1_16MHZ : aliased MSP430_SVD.Byte; -- DCOCTL Calibration Data for 12MHz CALDCO_12MHZ : aliased MSP430_SVD.Byte; -- BCSCTL1 Calibration Data for 12MHz CALBC1_12MHZ : aliased MSP430_SVD.Byte; -- DCOCTL Calibration Data for 8MHz CALDCO_8MHZ : aliased MSP430_SVD.Byte; -- BCSCTL1 Calibration Data for 8MHz CALBC1_8MHZ : aliased MSP430_SVD.Byte; -- DCOCTL Calibration Data for 1MHz CALDCO_1MHZ : aliased MSP430_SVD.Byte; -- BCSCTL1 Calibration Data for 1MHz CALBC1_1MHZ : aliased MSP430_SVD.Byte; end record with Volatile; for CALIBRATION_DATA_Peripheral use record CALDCO_16MHZ at 16#0# range 0 .. 7; CALBC1_16MHZ at 16#1# range 0 .. 7; CALDCO_12MHZ at 16#2# range 0 .. 7; CALBC1_12MHZ at 16#3# range 0 .. 7; CALDCO_8MHZ at 16#4# range 0 .. 7; CALBC1_8MHZ at 16#5# range 0 .. 7; CALDCO_1MHZ at 16#6# range 0 .. 7; CALBC1_1MHZ at 16#7# range 0 .. 7; end record; -- Calibration Data CALIBRATION_DATA_Periph : aliased CALIBRATION_DATA_Peripheral with Import, Address => CALIBRATION_DATA_Base; end MSP430_SVD.CALIBRATION_DATA;
Fabien-Chouteau/GESTE
Ada
238,521
ads
package GESTE_Fonts.FreeSerifBoldItalic24pt7b is Font : constant Bitmap_Font_Ref; private FreeSerifBoldItalic24pt7bBitmaps : 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#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#F0#, 16#00#, 16#00#, 16#00#, 16#00#, 16#1F#, 16#80#, 16#00#, 16#00#, 16#00#, 16#01#, 16#F8#, 16#00#, 16#00#, 16#00#, 16#00#, 16#1F#, 16#80#, 16#00#, 16#00#, 16#00#, 16#03#, 16#F8#, 16#00#, 16#00#, 16#00#, 16#00#, 16#3F#, 16#80#, 16#00#, 16#00#, 16#00#, 16#03#, 16#F8#, 16#00#, 16#00#, 16#00#, 16#00#, 16#3F#, 16#00#, 16#00#, 16#00#, 16#00#, 16#03#, 16#F0#, 16#00#, 16#00#, 16#00#, 16#00#, 16#3E#, 16#00#, 16#00#, 16#00#, 16#00#, 16#03#, 16#E0#, 16#00#, 16#00#, 16#00#, 16#00#, 16#3C#, 16#00#, 16#00#, 16#00#, 16#00#, 16#07#, 16#C0#, 16#00#, 16#00#, 16#00#, 16#00#, 16#78#, 16#00#, 16#00#, 16#00#, 16#00#, 16#07#, 16#80#, 16#00#, 16#00#, 16#00#, 16#00#, 16#70#, 16#00#, 16#00#, 16#00#, 16#00#, 16#07#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#60#, 16#00#, 16#00#, 16#00#, 16#00#, 16#06#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#C0#, 16#00#, 16#00#, 16#00#, 16#00#, 16#0C#, 16#00#, 16#00#, 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#70#, 16#00#, 16#00#, 16#00#, 16#00#, 16#0F#, 16#80#, 16#00#, 16#00#, 16#00#, 16#01#, 16#FC#, 16#00#, 16#00#, 16#00#, 16#00#, 16#1F#, 16#C0#, 16#00#, 16#00#, 16#00#, 16#01#, 16#FC#, 16#00#, 16#00#, 16#00#, 16#00#, 16#0F#, 16#80#, 16#00#, 16#00#, 16#00#, 16#00#, 16#70#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#07#, 16#00#, 16#70#, 16#00#, 16#00#, 16#00#, 16#F8#, 16#0F#, 16#80#, 16#00#, 16#00#, 16#1F#, 16#80#, 16#F8#, 16#00#, 16#00#, 16#01#, 16#F8#, 16#1F#, 16#80#, 16#00#, 16#00#, 16#1F#, 16#01#, 16#F0#, 16#00#, 16#00#, 16#01#, 16#F0#, 16#1F#, 16#00#, 16#00#, 16#00#, 16#1E#, 16#01#, 16#F0#, 16#00#, 16#00#, 16#01#, 16#E0#, 16#1E#, 16#00#, 16#00#, 16#00#, 16#1C#, 16#01#, 16#E0#, 16#00#, 16#00#, 16#01#, 16#C0#, 16#1C#, 16#00#, 16#00#, 16#00#, 16#18#, 16#01#, 16#C0#, 16#00#, 16#00#, 16#03#, 16#80#, 16#18#, 16#00#, 16#00#, 16#00#, 16#38#, 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#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#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#07#, 16#80#, 16#00#, 16#00#, 16#00#, 16#E0#, 16#70#, 16#00#, 16#00#, 16#00#, 16#1E#, 16#0F#, 16#00#, 16#00#, 16#00#, 16#01#, 16#E0#, 16#F0#, 16#00#, 16#00#, 16#00#, 16#1C#, 16#0E#, 16#00#, 16#00#, 16#00#, 16#03#, 16#C1#, 16#E0#, 16#00#, 16#00#, 16#00#, 16#38#, 16#1C#, 16#00#, 16#00#, 16#00#, 16#07#, 16#83#, 16#C0#, 16#00#, 16#00#, 16#00#, 16#78#, 16#3C#, 16#00#, 16#00#, 16#00#, 16#0F#, 16#07#, 16#80#, 16#00#, 16#00#, 16#1F#, 16#FF#, 16#FF#, 16#80#, 16#00#, 16#01#, 16#FF#, 16#FF#, 16#F8#, 16#00#, 16#00#, 16#1F#, 16#FF#, 16#FF#, 16#00#, 16#00#, 16#00#, 16#1C#, 16#0E#, 16#00#, 16#00#, 16#00#, 16#03#, 16#C1#, 16#E0#, 16#00#, 16#00#, 16#00#, 16#3C#, 16#1E#, 16#00#, 16#00#, 16#00#, 16#03#, 16#81#, 16#C0#, 16#00#, 16#00#, 16#00#, 16#78#, 16#3C#, 16#00#, 16#00#, 16#00#, 16#07#, 16#83#, 16#C0#, 16#00#, 16#00#, 16#00#, 16#70#, 16#38#, 16#00#, 16#00#, 16#00#, 16#FF#, 16#FF#, 16#F8#, 16#00#, 16#00#, 16#0F#, 16#FF#, 16#FF#, 16#80#, 16#00#, 16#00#, 16#FF#, 16#FF#, 16#F0#, 16#00#, 16#00#, 16#01#, 16#C0#, 16#E0#, 16#00#, 16#00#, 16#00#, 16#3C#, 16#1E#, 16#00#, 16#00#, 16#00#, 16#03#, 16#C1#, 16#E0#, 16#00#, 16#00#, 16#00#, 16#38#, 16#1C#, 16#00#, 16#00#, 16#00#, 16#07#, 16#83#, 16#C0#, 16#00#, 16#00#, 16#00#, 16#70#, 16#38#, 16#00#, 16#00#, 16#00#, 16#0F#, 16#07#, 16#80#, 16#00#, 16#00#, 16#00#, 16#F0#, 16#78#, 16#00#, 16#00#, 16#00#, 16#0E#, 16#07#, 16#00#, 16#00#, 16#00#, 16#00#, 16#E0#, 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#1C#, 16#00#, 16#00#, 16#00#, 16#00#, 16#01#, 16#80#, 16#00#, 16#00#, 16#00#, 16#00#, 16#18#, 16#00#, 16#00#, 16#00#, 16#00#, 16#3F#, 16#E0#, 16#00#, 16#00#, 16#00#, 16#0F#, 16#FF#, 16#80#, 16#00#, 16#00#, 16#03#, 16#E3#, 16#3C#, 16#00#, 16#00#, 16#00#, 16#78#, 16#31#, 16#E0#, 16#00#, 16#00#, 16#07#, 16#87#, 16#0E#, 16#00#, 16#00#, 16#00#, 16#F0#, 16#60#, 16#E0#, 16#00#, 16#00#, 16#0F#, 16#06#, 16#0C#, 16#00#, 16#00#, 16#00#, 16#F8#, 16#60#, 16#C0#, 16#00#, 16#00#, 16#0F#, 16#8E#, 16#0C#, 16#00#, 16#00#, 16#00#, 16#FC#, 16#C0#, 16#00#, 16#00#, 16#00#, 16#0F#, 16#FC#, 16#00#, 16#00#, 16#00#, 16#00#, 16#FF#, 16#C0#, 16#00#, 16#00#, 16#00#, 16#07#, 16#FE#, 16#00#, 16#00#, 16#00#, 16#00#, 16#3F#, 16#F0#, 16#00#, 16#00#, 16#00#, 16#01#, 16#FF#, 16#80#, 16#00#, 16#00#, 16#00#, 16#0F#, 16#FC#, 16#00#, 16#00#, 16#00#, 16#00#, 16#3F#, 16#E0#, 16#00#, 16#00#, 16#00#, 16#03#, 16#FE#, 16#00#, 16#00#, 16#00#, 16#00#, 16#7F#, 16#F0#, 16#00#, 16#00#, 16#00#, 16#07#, 16#7F#, 16#00#, 16#00#, 16#00#, 16#40#, 16#63#, 16#F0#, 16#00#, 16#00#, 16#04#, 16#06#, 16#1F#, 16#00#, 16#00#, 16#00#, 16#C0#, 16#E1#, 16#F0#, 16#00#, 16#00#, 16#0C#, 16#0C#, 16#1F#, 16#00#, 16#00#, 16#00#, 16#C0#, 16#C1#, 16#F0#, 16#00#, 16#00#, 16#0E#, 16#1C#, 16#1E#, 16#00#, 16#00#, 16#00#, 16#E1#, 16#83#, 16#E0#, 16#00#, 16#00#, 16#0F#, 16#18#, 16#3C#, 16#00#, 16#00#, 16#00#, 16#79#, 16#8F#, 16#80#, 16#00#, 16#00#, 16#01#, 16#FF#, 16#E0#, 16#00#, 16#00#, 16#00#, 16#07#, 16#F8#, 16#00#, 16#00#, 16#00#, 16#00#, 16#30#, 16#00#, 16#00#, 16#00#, 16#00#, 16#07#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#70#, 16#00#, 16#00#, 16#00#, 16#00#, 16#06#, 16#00#, 16#00#, 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#3C#, 16#00#, 16#1C#, 16#00#, 16#00#, 16#0F#, 16#F0#, 16#03#, 16#80#, 16#00#, 16#03#, 16#F3#, 16#C0#, 16#F8#, 16#00#, 16#00#, 16#7E#, 16#1F#, 16#FF#, 16#00#, 16#00#, 16#0F#, 16#C0#, 16#FE#, 16#70#, 16#00#, 16#00#, 16#FC#, 16#0C#, 16#0E#, 16#00#, 16#00#, 16#1F#, 16#80#, 16#C0#, 16#C0#, 16#00#, 16#01#, 16#F8#, 16#0C#, 16#1C#, 16#00#, 16#00#, 16#3F#, 16#00#, 16#C1#, 16#80#, 16#00#, 16#03#, 16#F0#, 16#08#, 16#38#, 16#00#, 16#00#, 16#3F#, 16#01#, 16#87#, 16#00#, 16#00#, 16#03#, 16#F0#, 16#18#, 16#70#, 16#00#, 16#00#, 16#3E#, 16#03#, 16#0E#, 16#00#, 16#00#, 16#03#, 16#E0#, 16#70#, 16#C0#, 16#00#, 16#00#, 16#3E#, 16#06#, 16#1C#, 16#07#, 16#C0#, 16#01#, 16#F1#, 16#C1#, 16#81#, 16#FF#, 16#00#, 16#0F#, 16#F8#, 16#38#, 16#3F#, 16#30#, 16#00#, 16#7E#, 16#07#, 16#07#, 16#E1#, 16#80#, 16#00#, 16#00#, 16#60#, 16#FC#, 16#08#, 16#00#, 16#00#, 16#0E#, 16#1F#, 16#80#, 16#80#, 16#00#, 16#00#, 16#C1#, 16#F8#, 16#08#, 16#00#, 16#00#, 16#1C#, 16#3F#, 16#01#, 16#80#, 16#00#, 16#01#, 16#83#, 16#F0#, 16#18#, 16#00#, 16#00#, 16#38#, 16#7F#, 16#01#, 16#80#, 16#00#, 16#07#, 16#07#, 16#E0#, 16#10#, 16#00#, 16#00#, 16#60#, 16#7E#, 16#03#, 16#00#, 16#00#, 16#0E#, 16#07#, 16#E0#, 16#20#, 16#00#, 16#00#, 16#C0#, 16#7E#, 16#06#, 16#00#, 16#00#, 16#1C#, 16#03#, 16#E0#, 16#C0#, 16#00#, 16#01#, 16#80#, 16#3F#, 16#18#, 16#00#, 16#00#, 16#38#, 16#01#, 16#FF#, 16#00#, 16#00#, 16#07#, 16#00#, 16#07#, 16#C0#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#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#00#, 16#01#, 16#FF#, 16#00#, 16#00#, 16#00#, 16#00#, 16#3C#, 16#78#, 16#00#, 16#00#, 16#00#, 16#07#, 16#83#, 16#C0#, 16#00#, 16#00#, 16#00#, 16#F8#, 16#3C#, 16#00#, 16#00#, 16#00#, 16#0F#, 16#83#, 16#C0#, 16#00#, 16#00#, 16#01#, 16#F8#, 16#3C#, 16#00#, 16#00#, 16#00#, 16#1F#, 16#83#, 16#C0#, 16#00#, 16#00#, 16#01#, 16#F8#, 16#78#, 16#00#, 16#00#, 16#00#, 16#1F#, 16#8F#, 16#00#, 16#00#, 16#00#, 16#01#, 16#F9#, 16#E0#, 16#00#, 16#00#, 16#00#, 16#1F#, 16#BC#, 16#00#, 16#00#, 16#00#, 16#01#, 16#FF#, 16#00#, 16#00#, 16#00#, 16#00#, 16#1F#, 16#C0#, 16#00#, 16#00#, 16#00#, 16#03#, 16#FC#, 16#00#, 16#00#, 16#00#, 16#00#, 16#FF#, 16#C1#, 16#FF#, 16#00#, 16#00#, 16#3E#, 16#FC#, 16#0F#, 16#E0#, 16#00#, 16#07#, 16#8F#, 16#E0#, 16#78#, 16#00#, 16#00#, 16#F0#, 16#7E#, 16#07#, 16#00#, 16#00#, 16#1E#, 16#07#, 16#E0#, 16#70#, 16#00#, 16#03#, 16#E0#, 16#7F#, 16#0E#, 16#00#, 16#00#, 16#7E#, 16#07#, 16#F0#, 16#C0#, 16#00#, 16#07#, 16#E0#, 16#3F#, 16#9C#, 16#00#, 16#00#, 16#FC#, 16#03#, 16#FB#, 16#80#, 16#00#, 16#0F#, 16#E0#, 16#1F#, 16#F0#, 16#00#, 16#00#, 16#FE#, 16#01#, 16#FE#, 16#00#, 16#00#, 16#0F#, 16#E0#, 16#0F#, 16#E0#, 16#00#, 16#00#, 16#FF#, 16#00#, 16#FF#, 16#00#, 16#00#, 16#07#, 16#F8#, 16#07#, 16#F8#, 16#10#, 16#00#, 16#7F#, 16#C0#, 16#FF#, 16#C3#, 16#00#, 16#03#, 16#FF#, 16#FF#, 16#FF#, 16#E0#, 16#00#, 16#1F#, 16#FF#, 16#0F#, 16#FC#, 16#00#, 16#00#, 16#3F#, 16#80#, 16#3F#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#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#00#, 16#01#, 16#F0#, 16#00#, 16#00#, 16#00#, 16#00#, 16#1F#, 16#80#, 16#00#, 16#00#, 16#00#, 16#01#, 16#F0#, 16#00#, 16#00#, 16#00#, 16#00#, 16#1F#, 16#00#, 16#00#, 16#00#, 16#00#, 16#01#, 16#E0#, 16#00#, 16#00#, 16#00#, 16#00#, 16#3E#, 16#00#, 16#00#, 16#00#, 16#00#, 16#03#, 16#C0#, 16#00#, 16#00#, 16#00#, 16#00#, 16#3C#, 16#00#, 16#00#, 16#00#, 16#00#, 16#03#, 16#C0#, 16#00#, 16#00#, 16#00#, 16#00#, 16#38#, 16#00#, 16#00#, 16#00#, 16#00#, 16#03#, 16#80#, 16#00#, 16#00#, 16#00#, 16#00#, 16#30#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#10#, 16#00#, 16#00#, 16#00#, 16#00#, 16#07#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#E0#, 16#00#, 16#00#, 16#00#, 16#00#, 16#1C#, 16#00#, 16#00#, 16#00#, 16#00#, 16#07#, 16#80#, 16#00#, 16#00#, 16#00#, 16#00#, 16#F0#, 16#00#, 16#00#, 16#00#, 16#00#, 16#0E#, 16#00#, 16#00#, 16#00#, 16#00#, 16#01#, 16#E0#, 16#00#, 16#00#, 16#00#, 16#00#, 16#3C#, 16#00#, 16#00#, 16#00#, 16#00#, 16#07#, 16#80#, 16#00#, 16#00#, 16#00#, 16#00#, 16#78#, 16#00#, 16#00#, 16#00#, 16#00#, 16#0F#, 16#00#, 16#00#, 16#00#, 16#00#, 16#01#, 16#F0#, 16#00#, 16#00#, 16#00#, 16#00#, 16#1F#, 16#00#, 16#00#, 16#00#, 16#00#, 16#01#, 16#E0#, 16#00#, 16#00#, 16#00#, 16#00#, 16#3E#, 16#00#, 16#00#, 16#00#, 16#00#, 16#03#, 16#E0#, 16#00#, 16#00#, 16#00#, 16#00#, 16#3E#, 16#00#, 16#00#, 16#00#, 16#00#, 16#03#, 16#C0#, 16#00#, 16#00#, 16#00#, 16#00#, 16#7C#, 16#00#, 16#00#, 16#00#, 16#00#, 16#07#, 16#C0#, 16#00#, 16#00#, 16#00#, 16#00#, 16#7C#, 16#00#, 16#00#, 16#00#, 16#00#, 16#07#, 16#C0#, 16#00#, 16#00#, 16#00#, 16#00#, 16#7C#, 16#00#, 16#00#, 16#00#, 16#00#, 16#07#, 16#C0#, 16#00#, 16#00#, 16#00#, 16#00#, 16#7C#, 16#00#, 16#00#, 16#00#, 16#00#, 16#03#, 16#C0#, 16#00#, 16#00#, 16#00#, 16#00#, 16#3C#, 16#00#, 16#00#, 16#00#, 16#00#, 16#03#, 16#C0#, 16#00#, 16#00#, 16#00#, 16#00#, 16#3C#, 16#00#, 16#00#, 16#00#, 16#00#, 16#03#, 16#C0#, 16#00#, 16#00#, 16#00#, 16#00#, 16#1C#, 16#00#, 16#00#, 16#00#, 16#00#, 16#01#, 16#C0#, 16#00#, 16#00#, 16#00#, 16#00#, 16#0C#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#E0#, 16#00#, 16#00#, 16#00#, 16#00#, 16#06#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#60#, 16#00#, 16#00#, 16#00#, 16#00#, 16#03#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#10#, 16#00#, 16#00#, 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#40#, 16#00#, 16#00#, 16#00#, 16#00#, 16#06#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#30#, 16#00#, 16#00#, 16#00#, 16#00#, 16#03#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#18#, 16#00#, 16#00#, 16#00#, 16#00#, 16#01#, 16#80#, 16#00#, 16#00#, 16#00#, 16#00#, 16#0C#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#C0#, 16#00#, 16#00#, 16#00#, 16#00#, 16#0E#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#E0#, 16#00#, 16#00#, 16#00#, 16#00#, 16#0F#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#F0#, 16#00#, 16#00#, 16#00#, 16#00#, 16#0F#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#F0#, 16#00#, 16#00#, 16#00#, 16#00#, 16#0F#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#F8#, 16#00#, 16#00#, 16#00#, 16#00#, 16#0F#, 16#80#, 16#00#, 16#00#, 16#00#, 16#00#, 16#F8#, 16#00#, 16#00#, 16#00#, 16#00#, 16#0F#, 16#80#, 16#00#, 16#00#, 16#00#, 16#00#, 16#F8#, 16#00#, 16#00#, 16#00#, 16#00#, 16#0F#, 16#80#, 16#00#, 16#00#, 16#00#, 16#00#, 16#F0#, 16#00#, 16#00#, 16#00#, 16#00#, 16#1F#, 16#00#, 16#00#, 16#00#, 16#00#, 16#01#, 16#F0#, 16#00#, 16#00#, 16#00#, 16#00#, 16#1F#, 16#00#, 16#00#, 16#00#, 16#00#, 16#01#, 16#F0#, 16#00#, 16#00#, 16#00#, 16#00#, 16#3E#, 16#00#, 16#00#, 16#00#, 16#00#, 16#03#, 16#E0#, 16#00#, 16#00#, 16#00#, 16#00#, 16#3C#, 16#00#, 16#00#, 16#00#, 16#00#, 16#07#, 16#C0#, 16#00#, 16#00#, 16#00#, 16#00#, 16#78#, 16#00#, 16#00#, 16#00#, 16#00#, 16#0F#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#F0#, 16#00#, 16#00#, 16#00#, 16#00#, 16#1E#, 16#00#, 16#00#, 16#00#, 16#00#, 16#01#, 16#C0#, 16#00#, 16#00#, 16#00#, 16#00#, 16#38#, 16#00#, 16#00#, 16#00#, 16#00#, 16#07#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#E0#, 16#00#, 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#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#01#, 16#C0#, 16#00#, 16#00#, 16#00#, 16#00#, 16#3C#, 16#00#, 16#00#, 16#00#, 16#00#, 16#03#, 16#E0#, 16#00#, 16#00#, 16#00#, 16#00#, 16#3C#, 16#00#, 16#00#, 16#00#, 16#00#, 16#E1#, 16#C3#, 16#00#, 16#00#, 16#00#, 16#1F#, 16#18#, 16#78#, 16#00#, 16#00#, 16#01#, 16#F1#, 16#8F#, 16#80#, 16#00#, 16#00#, 16#1F#, 16#89#, 16#F8#, 16#00#, 16#00#, 16#00#, 16#FC#, 16#BF#, 16#00#, 16#00#, 16#00#, 16#00#, 16#3C#, 16#00#, 16#00#, 16#00#, 16#00#, 16#03#, 16#C0#, 16#00#, 16#00#, 16#00#, 16#0F#, 16#CB#, 16#F0#, 16#00#, 16#00#, 16#01#, 16#F8#, 16#9F#, 16#80#, 16#00#, 16#00#, 16#1F#, 16#98#, 16#F8#, 16#00#, 16#00#, 16#01#, 16#F1#, 16#87#, 16#80#, 16#00#, 16#00#, 16#0E#, 16#1C#, 16#30#, 16#00#, 16#00#, 16#00#, 16#03#, 16#C0#, 16#00#, 16#00#, 16#00#, 16#00#, 16#3E#, 16#00#, 16#00#, 16#00#, 16#00#, 16#03#, 16#C0#, 16#00#, 16#00#, 16#00#, 16#00#, 16#1C#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#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#00#, 16#01#, 16#E0#, 16#00#, 16#00#, 16#00#, 16#00#, 16#1E#, 16#00#, 16#00#, 16#00#, 16#00#, 16#01#, 16#E0#, 16#00#, 16#00#, 16#00#, 16#00#, 16#1E#, 16#00#, 16#00#, 16#00#, 16#00#, 16#01#, 16#E0#, 16#00#, 16#00#, 16#00#, 16#00#, 16#1E#, 16#00#, 16#00#, 16#00#, 16#00#, 16#01#, 16#E0#, 16#00#, 16#00#, 16#00#, 16#00#, 16#1E#, 16#00#, 16#00#, 16#00#, 16#03#, 16#FF#, 16#FF#, 16#F8#, 16#00#, 16#00#, 16#3F#, 16#FF#, 16#FF#, 16#80#, 16#00#, 16#03#, 16#FF#, 16#FF#, 16#F8#, 16#00#, 16#00#, 16#3F#, 16#FF#, 16#FF#, 16#80#, 16#00#, 16#00#, 16#01#, 16#E0#, 16#00#, 16#00#, 16#00#, 16#00#, 16#1E#, 16#00#, 16#00#, 16#00#, 16#00#, 16#01#, 16#E0#, 16#00#, 16#00#, 16#00#, 16#00#, 16#1E#, 16#00#, 16#00#, 16#00#, 16#00#, 16#01#, 16#E0#, 16#00#, 16#00#, 16#00#, 16#00#, 16#1E#, 16#00#, 16#00#, 16#00#, 16#00#, 16#01#, 16#E0#, 16#00#, 16#00#, 16#00#, 16#00#, 16#1E#, 16#00#, 16#00#, 16#00#, 16#00#, 16#01#, 16#E0#, 16#00#, 16#00#, 16#00#, 16#00#, 16#1E#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#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#00#, 16#00#, 16#FC#, 16#00#, 16#00#, 16#00#, 16#00#, 16#0F#, 16#C0#, 16#00#, 16#00#, 16#00#, 16#00#, 16#FE#, 16#00#, 16#00#, 16#00#, 16#00#, 16#0F#, 16#E0#, 16#00#, 16#00#, 16#00#, 16#00#, 16#FE#, 16#00#, 16#00#, 16#00#, 16#00#, 16#07#, 16#E0#, 16#00#, 16#00#, 16#00#, 16#00#, 16#3C#, 16#00#, 16#00#, 16#00#, 16#00#, 16#01#, 16#C0#, 16#00#, 16#00#, 16#00#, 16#00#, 16#38#, 16#00#, 16#00#, 16#00#, 16#00#, 16#03#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#60#, 16#00#, 16#00#, 16#00#, 16#00#, 16#0C#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#80#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#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#F8#, 16#00#, 16#00#, 16#00#, 16#07#, 16#FF#, 16#00#, 16#00#, 16#00#, 16#00#, 16#7F#, 16#F0#, 16#00#, 16#00#, 16#00#, 16#0F#, 16#FF#, 16#00#, 16#00#, 16#00#, 16#00#, 16#FF#, 16#F0#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#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#00#, 16#00#, 16#FC#, 16#00#, 16#00#, 16#00#, 16#00#, 16#0F#, 16#C0#, 16#00#, 16#00#, 16#00#, 16#00#, 16#FE#, 16#00#, 16#00#, 16#00#, 16#00#, 16#0F#, 16#C0#, 16#00#, 16#00#, 16#00#, 16#00#, 16#FC#, 16#00#, 16#00#, 16#00#, 16#00#, 16#07#, 16#80#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#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#00#, 16#03#, 16#C0#, 16#00#, 16#00#, 16#00#, 16#00#, 16#3C#, 16#00#, 16#00#, 16#00#, 16#00#, 16#07#, 16#80#, 16#00#, 16#00#, 16#00#, 16#00#, 16#78#, 16#00#, 16#00#, 16#00#, 16#00#, 16#0F#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#F0#, 16#00#, 16#00#, 16#00#, 16#00#, 16#1E#, 16#00#, 16#00#, 16#00#, 16#00#, 16#01#, 16#E0#, 16#00#, 16#00#, 16#00#, 16#00#, 16#3E#, 16#00#, 16#00#, 16#00#, 16#00#, 16#03#, 16#C0#, 16#00#, 16#00#, 16#00#, 16#00#, 16#3C#, 16#00#, 16#00#, 16#00#, 16#00#, 16#07#, 16#80#, 16#00#, 16#00#, 16#00#, 16#00#, 16#78#, 16#00#, 16#00#, 16#00#, 16#00#, 16#0F#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#F0#, 16#00#, 16#00#, 16#00#, 16#00#, 16#1E#, 16#00#, 16#00#, 16#00#, 16#00#, 16#01#, 16#E0#, 16#00#, 16#00#, 16#00#, 16#00#, 16#3C#, 16#00#, 16#00#, 16#00#, 16#00#, 16#03#, 16#C0#, 16#00#, 16#00#, 16#00#, 16#00#, 16#7C#, 16#00#, 16#00#, 16#00#, 16#00#, 16#07#, 16#80#, 16#00#, 16#00#, 16#00#, 16#00#, 16#78#, 16#00#, 16#00#, 16#00#, 16#00#, 16#0F#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#F0#, 16#00#, 16#00#, 16#00#, 16#00#, 16#1E#, 16#00#, 16#00#, 16#00#, 16#00#, 16#01#, 16#E0#, 16#00#, 16#00#, 16#00#, 16#00#, 16#3C#, 16#00#, 16#00#, 16#00#, 16#00#, 16#03#, 16#C0#, 16#00#, 16#00#, 16#00#, 16#00#, 16#7C#, 16#00#, 16#00#, 16#00#, 16#00#, 16#07#, 16#80#, 16#00#, 16#00#, 16#00#, 16#00#, 16#F8#, 16#00#, 16#00#, 16#00#, 16#00#, 16#0F#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#FC#, 16#00#, 16#00#, 16#00#, 16#00#, 16#3C#, 16#60#, 16#00#, 16#00#, 16#00#, 16#07#, 16#87#, 16#00#, 16#00#, 16#00#, 16#00#, 16#F0#, 16#38#, 16#00#, 16#00#, 16#00#, 16#1F#, 16#03#, 16#80#, 16#00#, 16#00#, 16#03#, 16#E0#, 16#7C#, 16#00#, 16#00#, 16#00#, 16#3E#, 16#07#, 16#C0#, 16#00#, 16#00#, 16#07#, 16#E0#, 16#7C#, 16#00#, 16#00#, 16#00#, 16#FC#, 16#07#, 16#C0#, 16#00#, 16#00#, 16#0F#, 16#C0#, 16#7C#, 16#00#, 16#00#, 16#01#, 16#FC#, 16#07#, 16#C0#, 16#00#, 16#00#, 16#1F#, 16#80#, 16#FC#, 16#00#, 16#00#, 16#01#, 16#F8#, 16#0F#, 16#C0#, 16#00#, 16#00#, 16#3F#, 16#80#, 16#FC#, 16#00#, 16#00#, 16#03#, 16#F8#, 16#0F#, 16#C0#, 16#00#, 16#00#, 16#3F#, 16#00#, 16#FC#, 16#00#, 16#00#, 16#07#, 16#F0#, 16#1F#, 16#C0#, 16#00#, 16#00#, 16#7F#, 16#01#, 16#FC#, 16#00#, 16#00#, 16#07#, 16#E0#, 16#1F#, 16#80#, 16#00#, 16#00#, 16#7E#, 16#01#, 16#F8#, 16#00#, 16#00#, 16#07#, 16#E0#, 16#3F#, 16#80#, 16#00#, 16#00#, 16#7E#, 16#03#, 16#F0#, 16#00#, 16#00#, 16#07#, 16#E0#, 16#3F#, 16#00#, 16#00#, 16#00#, 16#7C#, 16#07#, 16#F0#, 16#00#, 16#00#, 16#07#, 16#C0#, 16#7E#, 16#00#, 16#00#, 16#00#, 16#7C#, 16#07#, 16#E0#, 16#00#, 16#00#, 16#07#, 16#C0#, 16#FC#, 16#00#, 16#00#, 16#00#, 16#7C#, 16#0F#, 16#80#, 16#00#, 16#00#, 16#03#, 16#C0#, 16#F8#, 16#00#, 16#00#, 16#00#, 16#3C#, 16#1F#, 16#00#, 16#00#, 16#00#, 16#01#, 16#C1#, 16#E0#, 16#00#, 16#00#, 16#00#, 16#0E#, 16#38#, 16#00#, 16#00#, 16#00#, 16#00#, 16#3E#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#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#00#, 16#1F#, 16#E0#, 16#00#, 16#00#, 16#00#, 16#1F#, 16#FE#, 16#00#, 16#00#, 16#00#, 16#00#, 16#0F#, 16#E0#, 16#00#, 16#00#, 16#00#, 16#00#, 16#FC#, 16#00#, 16#00#, 16#00#, 16#00#, 16#0F#, 16#C0#, 16#00#, 16#00#, 16#00#, 16#00#, 16#FC#, 16#00#, 16#00#, 16#00#, 16#00#, 16#1F#, 16#C0#, 16#00#, 16#00#, 16#00#, 16#01#, 16#F8#, 16#00#, 16#00#, 16#00#, 16#00#, 16#1F#, 16#80#, 16#00#, 16#00#, 16#00#, 16#01#, 16#F8#, 16#00#, 16#00#, 16#00#, 16#00#, 16#3F#, 16#80#, 16#00#, 16#00#, 16#00#, 16#03#, 16#F0#, 16#00#, 16#00#, 16#00#, 16#00#, 16#3F#, 16#00#, 16#00#, 16#00#, 16#00#, 16#07#, 16#F0#, 16#00#, 16#00#, 16#00#, 16#00#, 16#7E#, 16#00#, 16#00#, 16#00#, 16#00#, 16#07#, 16#E0#, 16#00#, 16#00#, 16#00#, 16#00#, 16#7E#, 16#00#, 16#00#, 16#00#, 16#00#, 16#0F#, 16#E0#, 16#00#, 16#00#, 16#00#, 16#00#, 16#FC#, 16#00#, 16#00#, 16#00#, 16#00#, 16#0F#, 16#C0#, 16#00#, 16#00#, 16#00#, 16#01#, 16#FC#, 16#00#, 16#00#, 16#00#, 16#00#, 16#1F#, 16#80#, 16#00#, 16#00#, 16#00#, 16#01#, 16#F8#, 16#00#, 16#00#, 16#00#, 16#00#, 16#1F#, 16#80#, 16#00#, 16#00#, 16#00#, 16#03#, 16#F8#, 16#00#, 16#00#, 16#00#, 16#00#, 16#3F#, 16#00#, 16#00#, 16#00#, 16#00#, 16#03#, 16#F0#, 16#00#, 16#00#, 16#00#, 16#00#, 16#7F#, 16#00#, 16#00#, 16#00#, 16#00#, 16#07#, 16#F0#, 16#00#, 16#00#, 16#00#, 16#01#, 16#FF#, 16#80#, 16#00#, 16#00#, 16#00#, 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#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#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#00#, 16#3F#, 16#F0#, 16#00#, 16#00#, 16#00#, 16#07#, 16#FF#, 16#80#, 16#00#, 16#00#, 16#00#, 16#FF#, 16#FC#, 16#00#, 16#00#, 16#00#, 16#1C#, 16#3F#, 16#C0#, 16#00#, 16#00#, 16#03#, 16#01#, 16#FE#, 16#00#, 16#00#, 16#00#, 16#60#, 16#0F#, 16#E0#, 16#00#, 16#00#, 16#04#, 16#00#, 16#FE#, 16#00#, 16#00#, 16#00#, 16#00#, 16#0F#, 16#E0#, 16#00#, 16#00#, 16#00#, 16#00#, 16#7E#, 16#00#, 16#00#, 16#00#, 16#00#, 16#0F#, 16#C0#, 16#00#, 16#00#, 16#00#, 16#00#, 16#FC#, 16#00#, 16#00#, 16#00#, 16#00#, 16#0F#, 16#C0#, 16#00#, 16#00#, 16#00#, 16#00#, 16#F8#, 16#00#, 16#00#, 16#00#, 16#00#, 16#1F#, 16#00#, 16#00#, 16#00#, 16#00#, 16#03#, 16#F0#, 16#00#, 16#00#, 16#00#, 16#00#, 16#3E#, 16#00#, 16#00#, 16#00#, 16#00#, 16#07#, 16#C0#, 16#00#, 16#00#, 16#00#, 16#00#, 16#F8#, 16#00#, 16#00#, 16#00#, 16#00#, 16#0F#, 16#00#, 16#00#, 16#00#, 16#00#, 16#01#, 16#C0#, 16#00#, 16#00#, 16#00#, 16#00#, 16#38#, 16#00#, 16#00#, 16#00#, 16#00#, 16#07#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#E0#, 16#08#, 16#00#, 16#00#, 16#00#, 16#1C#, 16#00#, 16#80#, 16#00#, 16#00#, 16#03#, 16#80#, 16#18#, 16#00#, 16#00#, 16#00#, 16#60#, 16#07#, 16#00#, 16#00#, 16#00#, 16#0F#, 16#FF#, 16#F0#, 16#00#, 16#00#, 16#01#, 16#FF#, 16#FE#, 16#00#, 16#00#, 16#00#, 16#3F#, 16#FF#, 16#E0#, 16#00#, 16#00#, 16#07#, 16#FF#, 16#FE#, 16#00#, 16#00#, 16#00#, 16#7F#, 16#FF#, 16#C0#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#FC#, 16#00#, 16#00#, 16#00#, 16#00#, 16#3F#, 16#F0#, 16#00#, 16#00#, 16#00#, 16#07#, 16#FF#, 16#80#, 16#00#, 16#00#, 16#00#, 16#C3#, 16#F8#, 16#00#, 16#00#, 16#00#, 16#10#, 16#1F#, 16#C0#, 16#00#, 16#00#, 16#02#, 16#00#, 16#FC#, 16#00#, 16#00#, 16#00#, 16#20#, 16#0F#, 16#C0#, 16#00#, 16#00#, 16#00#, 16#00#, 16#FC#, 16#00#, 16#00#, 16#00#, 16#00#, 16#0F#, 16#C0#, 16#00#, 16#00#, 16#00#, 16#00#, 16#F8#, 16#00#, 16#00#, 16#00#, 16#00#, 16#1F#, 16#80#, 16#00#, 16#00#, 16#00#, 16#01#, 16#F0#, 16#00#, 16#00#, 16#00#, 16#00#, 16#7C#, 16#00#, 16#00#, 16#00#, 16#00#, 16#0F#, 16#80#, 16#00#, 16#00#, 16#00#, 16#07#, 16#FC#, 16#00#, 16#00#, 16#00#, 16#01#, 16#FF#, 16#C0#, 16#00#, 16#00#, 16#00#, 16#03#, 16#FE#, 16#00#, 16#00#, 16#00#, 16#00#, 16#0F#, 16#F0#, 16#00#, 16#00#, 16#00#, 16#00#, 16#7F#, 16#00#, 16#00#, 16#00#, 16#00#, 16#03#, 16#F0#, 16#00#, 16#00#, 16#00#, 16#00#, 16#3F#, 16#00#, 16#00#, 16#00#, 16#00#, 16#03#, 16#F0#, 16#00#, 16#00#, 16#00#, 16#00#, 16#3F#, 16#00#, 16#00#, 16#00#, 16#00#, 16#03#, 16#F0#, 16#00#, 16#00#, 16#00#, 16#00#, 16#3E#, 16#00#, 16#00#, 16#00#, 16#00#, 16#03#, 16#E0#, 16#00#, 16#00#, 16#00#, 16#00#, 16#3E#, 16#00#, 16#00#, 16#00#, 16#78#, 16#03#, 16#C0#, 16#00#, 16#00#, 16#0F#, 16#C0#, 16#78#, 16#00#, 16#00#, 16#00#, 16#FC#, 16#0F#, 16#00#, 16#00#, 16#00#, 16#0F#, 16#E1#, 16#E0#, 16#00#, 16#00#, 16#00#, 16#7F#, 16#F8#, 16#00#, 16#00#, 16#00#, 16#01#, 16#FE#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#70#, 16#00#, 16#00#, 16#00#, 16#00#, 16#0F#, 16#00#, 16#00#, 16#00#, 16#00#, 16#01#, 16#F0#, 16#00#, 16#00#, 16#00#, 16#00#, 16#3F#, 16#00#, 16#00#, 16#00#, 16#00#, 16#07#, 16#E0#, 16#00#, 16#00#, 16#00#, 16#00#, 16#FE#, 16#00#, 16#00#, 16#00#, 16#00#, 16#1F#, 16#E0#, 16#00#, 16#00#, 16#00#, 16#03#, 16#7E#, 16#00#, 16#00#, 16#00#, 16#00#, 16#6F#, 16#C0#, 16#00#, 16#00#, 16#00#, 16#0C#, 16#FC#, 16#00#, 16#00#, 16#00#, 16#01#, 16#8F#, 16#C0#, 16#00#, 16#00#, 16#00#, 16#38#, 16#FC#, 16#00#, 16#00#, 16#00#, 16#07#, 16#1F#, 16#80#, 16#00#, 16#00#, 16#00#, 16#E1#, 16#F8#, 16#00#, 16#00#, 16#00#, 16#0C#, 16#1F#, 16#80#, 16#00#, 16#00#, 16#01#, 16#83#, 16#F0#, 16#00#, 16#00#, 16#00#, 16#30#, 16#3F#, 16#00#, 16#00#, 16#00#, 16#06#, 16#03#, 16#F0#, 16#00#, 16#00#, 16#00#, 16#C0#, 16#3F#, 16#00#, 16#00#, 16#00#, 16#18#, 16#07#, 16#E0#, 16#00#, 16#00#, 16#03#, 16#00#, 16#7E#, 16#00#, 16#00#, 16#00#, 16#7F#, 16#FF#, 16#FC#, 16#00#, 16#00#, 16#07#, 16#FF#, 16#FF#, 16#C0#, 16#00#, 16#00#, 16#7F#, 16#FF#, 16#F8#, 16#00#, 16#00#, 16#0F#, 16#FF#, 16#FF#, 16#80#, 16#00#, 16#00#, 16#00#, 16#0F#, 16#C0#, 16#00#, 16#00#, 16#00#, 16#01#, 16#F8#, 16#00#, 16#00#, 16#00#, 16#00#, 16#1F#, 16#80#, 16#00#, 16#00#, 16#00#, 16#01#, 16#F8#, 16#00#, 16#00#, 16#00#, 16#00#, 16#3F#, 16#80#, 16#00#, 16#00#, 16#00#, 16#03#, 16#F0#, 16#00#, 16#00#, 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#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#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#00#, 16#03#, 16#FF#, 16#E0#, 16#00#, 16#00#, 16#00#, 16#7F#, 16#FE#, 16#00#, 16#00#, 16#00#, 16#07#, 16#FF#, 16#E0#, 16#00#, 16#00#, 16#00#, 16#7F#, 16#FC#, 16#00#, 16#00#, 16#00#, 16#0C#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#C0#, 16#00#, 16#00#, 16#00#, 16#00#, 16#18#, 16#00#, 16#00#, 16#00#, 16#00#, 16#01#, 16#80#, 16#00#, 16#00#, 16#00#, 16#00#, 16#3F#, 16#80#, 16#00#, 16#00#, 16#00#, 16#03#, 16#FE#, 16#00#, 16#00#, 16#00#, 16#00#, 16#7F#, 16#F8#, 16#00#, 16#00#, 16#00#, 16#07#, 16#FF#, 16#C0#, 16#00#, 16#00#, 16#00#, 16#7F#, 16#FC#, 16#00#, 16#00#, 16#00#, 16#00#, 16#7F#, 16#E0#, 16#00#, 16#00#, 16#00#, 16#01#, 16#FF#, 16#00#, 16#00#, 16#00#, 16#00#, 16#07#, 16#F0#, 16#00#, 16#00#, 16#00#, 16#00#, 16#3F#, 16#00#, 16#00#, 16#00#, 16#00#, 16#03#, 16#F0#, 16#00#, 16#00#, 16#00#, 16#00#, 16#1F#, 16#00#, 16#00#, 16#00#, 16#00#, 16#01#, 16#F0#, 16#00#, 16#00#, 16#00#, 16#00#, 16#1F#, 16#00#, 16#00#, 16#00#, 16#00#, 16#01#, 16#F0#, 16#00#, 16#00#, 16#00#, 16#00#, 16#1F#, 16#00#, 16#00#, 16#00#, 16#00#, 16#01#, 16#E0#, 16#00#, 16#00#, 16#00#, 16#00#, 16#1E#, 16#00#, 16#00#, 16#00#, 16#78#, 16#03#, 16#C0#, 16#00#, 16#00#, 16#07#, 16#C0#, 16#38#, 16#00#, 16#00#, 16#00#, 16#FE#, 16#07#, 16#00#, 16#00#, 16#00#, 16#07#, 16#F1#, 16#E0#, 16#00#, 16#00#, 16#00#, 16#7F#, 16#F8#, 16#00#, 16#00#, 16#00#, 16#01#, 16#FE#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#03#, 16#00#, 16#00#, 16#00#, 16#00#, 16#03#, 16#E0#, 16#00#, 16#00#, 16#00#, 16#01#, 16#F8#, 16#00#, 16#00#, 16#00#, 16#00#, 16#7E#, 16#00#, 16#00#, 16#00#, 16#00#, 16#0F#, 16#C0#, 16#00#, 16#00#, 16#00#, 16#03#, 16#F0#, 16#00#, 16#00#, 16#00#, 16#00#, 16#7E#, 16#00#, 16#00#, 16#00#, 16#00#, 16#0F#, 16#C0#, 16#00#, 16#00#, 16#00#, 16#01#, 16#FC#, 16#00#, 16#00#, 16#00#, 16#00#, 16#3F#, 16#80#, 16#00#, 16#00#, 16#00#, 16#07#, 16#F0#, 16#00#, 16#00#, 16#00#, 16#00#, 16#7F#, 16#00#, 16#00#, 16#00#, 16#00#, 16#0F#, 16#EF#, 16#80#, 16#00#, 16#00#, 16#01#, 16#FF#, 16#FE#, 16#00#, 16#00#, 16#00#, 16#1F#, 16#C3#, 16#F0#, 16#00#, 16#00#, 16#01#, 16#FC#, 16#1F#, 16#00#, 16#00#, 16#00#, 16#3F#, 16#81#, 16#F8#, 16#00#, 16#00#, 16#03#, 16#F8#, 16#1F#, 16#80#, 16#00#, 16#00#, 16#3F#, 16#01#, 16#F8#, 16#00#, 16#00#, 16#07#, 16#F0#, 16#1F#, 16#80#, 16#00#, 16#00#, 16#7F#, 16#01#, 16#F8#, 16#00#, 16#00#, 16#07#, 16#E0#, 16#3F#, 16#80#, 16#00#, 16#00#, 16#7E#, 16#03#, 16#F8#, 16#00#, 16#00#, 16#07#, 16#E0#, 16#3F#, 16#80#, 16#00#, 16#00#, 16#7E#, 16#03#, 16#F0#, 16#00#, 16#00#, 16#03#, 16#E0#, 16#7F#, 16#00#, 16#00#, 16#00#, 16#3E#, 16#07#, 16#E0#, 16#00#, 16#00#, 16#03#, 16#E0#, 16#FE#, 16#00#, 16#00#, 16#00#, 16#1E#, 16#0F#, 16#C0#, 16#00#, 16#00#, 16#00#, 16#F1#, 16#F8#, 16#00#, 16#00#, 16#00#, 16#07#, 16#FE#, 16#00#, 16#00#, 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#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#01#, 16#FF#, 16#FF#, 16#80#, 16#00#, 16#00#, 16#1F#, 16#FF#, 16#F8#, 16#00#, 16#00#, 16#01#, 16#FF#, 16#FF#, 16#00#, 16#00#, 16#00#, 16#3F#, 16#FF#, 16#F0#, 16#00#, 16#00#, 16#03#, 16#FF#, 16#FE#, 16#00#, 16#00#, 16#00#, 16#70#, 16#01#, 16#C0#, 16#00#, 16#00#, 16#04#, 16#00#, 16#3C#, 16#00#, 16#00#, 16#00#, 16#C0#, 16#07#, 16#80#, 16#00#, 16#00#, 16#08#, 16#00#, 16#78#, 16#00#, 16#00#, 16#00#, 16#00#, 16#0F#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#F0#, 16#00#, 16#00#, 16#00#, 16#00#, 16#1E#, 16#00#, 16#00#, 16#00#, 16#00#, 16#03#, 16#C0#, 16#00#, 16#00#, 16#00#, 16#00#, 16#3C#, 16#00#, 16#00#, 16#00#, 16#00#, 16#07#, 16#80#, 16#00#, 16#00#, 16#00#, 16#00#, 16#78#, 16#00#, 16#00#, 16#00#, 16#00#, 16#0F#, 16#00#, 16#00#, 16#00#, 16#00#, 16#01#, 16#F0#, 16#00#, 16#00#, 16#00#, 16#00#, 16#1E#, 16#00#, 16#00#, 16#00#, 16#00#, 16#03#, 16#C0#, 16#00#, 16#00#, 16#00#, 16#00#, 16#3C#, 16#00#, 16#00#, 16#00#, 16#00#, 16#07#, 16#80#, 16#00#, 16#00#, 16#00#, 16#00#, 16#F8#, 16#00#, 16#00#, 16#00#, 16#00#, 16#0F#, 16#00#, 16#00#, 16#00#, 16#00#, 16#01#, 16#E0#, 16#00#, 16#00#, 16#00#, 16#00#, 16#1E#, 16#00#, 16#00#, 16#00#, 16#00#, 16#03#, 16#C0#, 16#00#, 16#00#, 16#00#, 16#00#, 16#7C#, 16#00#, 16#00#, 16#00#, 16#00#, 16#07#, 16#80#, 16#00#, 16#00#, 16#00#, 16#00#, 16#F8#, 16#00#, 16#00#, 16#00#, 16#00#, 16#0F#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#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#00#, 16#7F#, 16#F0#, 16#00#, 16#00#, 16#00#, 16#0F#, 16#8F#, 16#80#, 16#00#, 16#00#, 16#01#, 16#F0#, 16#3C#, 16#00#, 16#00#, 16#00#, 16#1E#, 16#03#, 16#C0#, 16#00#, 16#00#, 16#03#, 16#E0#, 16#3E#, 16#00#, 16#00#, 16#00#, 16#3E#, 16#03#, 16#E0#, 16#00#, 16#00#, 16#03#, 16#E0#, 16#3E#, 16#00#, 16#00#, 16#00#, 16#3E#, 16#03#, 16#E0#, 16#00#, 16#00#, 16#03#, 16#E0#, 16#3C#, 16#00#, 16#00#, 16#00#, 16#3F#, 16#03#, 16#C0#, 16#00#, 16#00#, 16#03#, 16#F8#, 16#78#, 16#00#, 16#00#, 16#00#, 16#3F#, 16#CF#, 16#00#, 16#00#, 16#00#, 16#01#, 16#FF#, 16#E0#, 16#00#, 16#00#, 16#00#, 16#1F#, 16#F8#, 16#00#, 16#00#, 16#00#, 16#00#, 16#FF#, 16#80#, 16#00#, 16#00#, 16#00#, 16#07#, 16#F8#, 16#00#, 16#00#, 16#00#, 16#01#, 16#FF#, 16#C0#, 16#00#, 16#00#, 16#00#, 16#79#, 16#FE#, 16#00#, 16#00#, 16#00#, 16#0F#, 16#0F#, 16#E0#, 16#00#, 16#00#, 16#01#, 16#E0#, 16#7F#, 16#00#, 16#00#, 16#00#, 16#3C#, 16#07#, 16#F0#, 16#00#, 16#00#, 16#07#, 16#C0#, 16#3F#, 16#00#, 16#00#, 16#00#, 16#7C#, 16#03#, 16#F0#, 16#00#, 16#00#, 16#07#, 16#80#, 16#1F#, 16#00#, 16#00#, 16#00#, 16#78#, 16#01#, 16#F0#, 16#00#, 16#00#, 16#07#, 16#80#, 16#1F#, 16#00#, 16#00#, 16#00#, 16#78#, 16#01#, 16#E0#, 16#00#, 16#00#, 16#07#, 16#80#, 16#3E#, 16#00#, 16#00#, 16#00#, 16#3C#, 16#03#, 16#C0#, 16#00#, 16#00#, 16#01#, 16#C0#, 16#78#, 16#00#, 16#00#, 16#00#, 16#0F#, 16#0F#, 16#00#, 16#00#, 16#00#, 16#00#, 16#3F#, 16#80#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#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#00#, 16#00#, 16#7F#, 16#E0#, 16#00#, 16#00#, 16#00#, 16#0F#, 16#C7#, 16#00#, 16#00#, 16#00#, 16#01#, 16#F8#, 16#78#, 16#00#, 16#00#, 16#00#, 16#3F#, 16#03#, 16#C0#, 16#00#, 16#00#, 16#07#, 16#E0#, 16#3C#, 16#00#, 16#00#, 16#00#, 16#7E#, 16#03#, 16#C0#, 16#00#, 16#00#, 16#0F#, 16#C0#, 16#7E#, 16#00#, 16#00#, 16#00#, 16#FC#, 16#07#, 16#E0#, 16#00#, 16#00#, 16#1F#, 16#C0#, 16#7E#, 16#00#, 16#00#, 16#01#, 16#FC#, 16#07#, 16#E0#, 16#00#, 16#00#, 16#1F#, 16#80#, 16#7E#, 16#00#, 16#00#, 16#01#, 16#F8#, 16#0F#, 16#E0#, 16#00#, 16#00#, 16#1F#, 16#80#, 16#FE#, 16#00#, 16#00#, 16#01#, 16#F8#, 16#0F#, 16#C0#, 16#00#, 16#00#, 16#1F#, 16#81#, 16#FC#, 16#00#, 16#00#, 16#00#, 16#F8#, 16#1F#, 16#C0#, 16#00#, 16#00#, 16#0F#, 16#81#, 16#F8#, 16#00#, 16#00#, 16#00#, 16#7C#, 16#3F#, 16#80#, 16#00#, 16#00#, 16#03#, 16#FF#, 16#F8#, 16#00#, 16#00#, 16#00#, 16#1F#, 16#FF#, 16#00#, 16#00#, 16#00#, 16#00#, 16#0F#, 16#E0#, 16#00#, 16#00#, 16#00#, 16#00#, 16#FE#, 16#00#, 16#00#, 16#00#, 16#00#, 16#1F#, 16#C0#, 16#00#, 16#00#, 16#00#, 16#03#, 16#F8#, 16#00#, 16#00#, 16#00#, 16#00#, 16#3F#, 16#00#, 16#00#, 16#00#, 16#00#, 16#07#, 16#E0#, 16#00#, 16#00#, 16#00#, 16#00#, 16#FC#, 16#00#, 16#00#, 16#00#, 16#00#, 16#1F#, 16#80#, 16#00#, 16#00#, 16#00#, 16#07#, 16#E0#, 16#00#, 16#00#, 16#00#, 16#00#, 16#F8#, 16#00#, 16#00#, 16#00#, 16#00#, 16#7E#, 16#00#, 16#00#, 16#00#, 16#00#, 16#0E#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#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#00#, 16#00#, 16#3F#, 16#00#, 16#00#, 16#00#, 16#00#, 16#03#, 16#F0#, 16#00#, 16#00#, 16#00#, 16#00#, 16#7F#, 16#00#, 16#00#, 16#00#, 16#00#, 16#03#, 16#F0#, 16#00#, 16#00#, 16#00#, 16#00#, 16#3F#, 16#00#, 16#00#, 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#01#, 16#C0#, 16#00#, 16#00#, 16#00#, 16#00#, 16#3E#, 16#00#, 16#00#, 16#00#, 16#00#, 16#07#, 16#F0#, 16#00#, 16#00#, 16#00#, 16#00#, 16#7F#, 16#00#, 16#00#, 16#00#, 16#00#, 16#07#, 16#F0#, 16#00#, 16#00#, 16#00#, 16#00#, 16#3E#, 16#00#, 16#00#, 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#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#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#00#, 16#00#, 16#3F#, 16#00#, 16#00#, 16#00#, 16#00#, 16#03#, 16#F0#, 16#00#, 16#00#, 16#00#, 16#00#, 16#7F#, 16#00#, 16#00#, 16#00#, 16#00#, 16#03#, 16#F0#, 16#00#, 16#00#, 16#00#, 16#00#, 16#3F#, 16#00#, 16#00#, 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#03#, 16#E0#, 16#00#, 16#00#, 16#00#, 16#00#, 16#7F#, 16#00#, 16#00#, 16#00#, 16#00#, 16#07#, 16#F0#, 16#00#, 16#00#, 16#00#, 16#00#, 16#7F#, 16#00#, 16#00#, 16#00#, 16#00#, 16#07#, 16#F0#, 16#00#, 16#00#, 16#00#, 16#00#, 16#3F#, 16#00#, 16#00#, 16#00#, 16#00#, 16#01#, 16#F0#, 16#00#, 16#00#, 16#00#, 16#00#, 16#0F#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#E0#, 16#00#, 16#00#, 16#00#, 16#00#, 16#0C#, 16#00#, 16#00#, 16#00#, 16#00#, 16#01#, 16#C0#, 16#00#, 16#00#, 16#00#, 16#00#, 16#30#, 16#00#, 16#00#, 16#00#, 16#00#, 16#0E#, 16#00#, 16#00#, 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#08#, 16#00#, 16#00#, 16#00#, 16#00#, 16#03#, 16#80#, 16#00#, 16#00#, 16#00#, 16#00#, 16#F8#, 16#00#, 16#00#, 16#00#, 16#00#, 16#3F#, 16#80#, 16#00#, 16#00#, 16#00#, 16#1F#, 16#F8#, 16#00#, 16#00#, 16#00#, 16#07#, 16#FE#, 16#00#, 16#00#, 16#00#, 16#01#, 16#FF#, 16#80#, 16#00#, 16#00#, 16#00#, 16#FF#, 16#E0#, 16#00#, 16#00#, 16#00#, 16#3F#, 16#F0#, 16#00#, 16#00#, 16#00#, 16#0F#, 16#FC#, 16#00#, 16#00#, 16#00#, 16#03#, 16#FF#, 16#00#, 16#00#, 16#00#, 16#00#, 16#7F#, 16#C0#, 16#00#, 16#00#, 16#00#, 16#07#, 16#E0#, 16#00#, 16#00#, 16#00#, 16#00#, 16#7F#, 16#80#, 16#00#, 16#00#, 16#00#, 16#07#, 16#FF#, 16#00#, 16#00#, 16#00#, 16#00#, 16#0F#, 16#FC#, 16#00#, 16#00#, 16#00#, 16#00#, 16#3F#, 16#F0#, 16#00#, 16#00#, 16#00#, 16#00#, 16#FF#, 16#E0#, 16#00#, 16#00#, 16#00#, 16#01#, 16#FF#, 16#80#, 16#00#, 16#00#, 16#00#, 16#07#, 16#FE#, 16#00#, 16#00#, 16#00#, 16#00#, 16#1F#, 16#F8#, 16#00#, 16#00#, 16#00#, 16#00#, 16#7F#, 16#80#, 16#00#, 16#00#, 16#00#, 16#00#, 16#F8#, 16#00#, 16#00#, 16#00#, 16#00#, 16#03#, 16#80#, 16#00#, 16#00#, 16#00#, 16#00#, 16#08#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#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#FF#, 16#E0#, 16#00#, 16#01#, 16#FF#, 16#FF#, 16#FE#, 16#00#, 16#00#, 16#1F#, 16#FF#, 16#FF#, 16#E0#, 16#00#, 16#01#, 16#FF#, 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#1F#, 16#FF#, 16#FF#, 16#E0#, 16#00#, 16#01#, 16#FF#, 16#FF#, 16#FE#, 16#00#, 16#00#, 16#1F#, 16#FF#, 16#FF#, 16#E0#, 16#00#, 16#01#, 16#FF#, 16#FF#, 16#FE#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#01#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#1C#, 16#00#, 16#00#, 16#00#, 16#00#, 16#01#, 16#F0#, 16#00#, 16#00#, 16#00#, 16#00#, 16#1F#, 16#E0#, 16#00#, 16#00#, 16#00#, 16#01#, 16#FF#, 16#80#, 16#00#, 16#00#, 16#00#, 16#07#, 16#FE#, 16#00#, 16#00#, 16#00#, 16#00#, 16#1F#, 16#F8#, 16#00#, 16#00#, 16#00#, 16#00#, 16#7F#, 16#F0#, 16#00#, 16#00#, 16#00#, 16#00#, 16#FF#, 16#C0#, 16#00#, 16#00#, 16#00#, 16#03#, 16#FF#, 16#00#, 16#00#, 16#00#, 16#00#, 16#0F#, 16#FE#, 16#00#, 16#00#, 16#00#, 16#00#, 16#1F#, 16#E0#, 16#00#, 16#00#, 16#00#, 16#00#, 16#7E#, 16#00#, 16#00#, 16#00#, 16#00#, 16#1F#, 16#E0#, 16#00#, 16#00#, 16#00#, 16#07#, 16#FE#, 16#00#, 16#00#, 16#00#, 16#03#, 16#FF#, 16#80#, 16#00#, 16#00#, 16#00#, 16#FF#, 16#C0#, 16#00#, 16#00#, 16#00#, 16#3F#, 16#F0#, 16#00#, 16#00#, 16#00#, 16#1F#, 16#FC#, 16#00#, 16#00#, 16#00#, 16#07#, 16#FE#, 16#00#, 16#00#, 16#00#, 16#01#, 16#FF#, 16#80#, 16#00#, 16#00#, 16#00#, 16#1F#, 16#E0#, 16#00#, 16#00#, 16#00#, 16#01#, 16#F8#, 16#00#, 16#00#, 16#00#, 16#00#, 16#1C#, 16#00#, 16#00#, 16#00#, 16#00#, 16#01#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#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#00#, 16#00#, 16#FF#, 16#E0#, 16#00#, 16#00#, 16#00#, 16#1E#, 16#1F#, 16#00#, 16#00#, 16#00#, 16#03#, 16#C0#, 16#F8#, 16#00#, 16#00#, 16#00#, 16#3C#, 16#0F#, 16#C0#, 16#00#, 16#00#, 16#03#, 16#E0#, 16#FC#, 16#00#, 16#00#, 16#00#, 16#3E#, 16#0F#, 16#C0#, 16#00#, 16#00#, 16#03#, 16#E0#, 16#FC#, 16#00#, 16#00#, 16#00#, 16#1C#, 16#0F#, 16#C0#, 16#00#, 16#00#, 16#00#, 16#01#, 16#FC#, 16#00#, 16#00#, 16#00#, 16#00#, 16#1F#, 16#80#, 16#00#, 16#00#, 16#00#, 16#03#, 16#F8#, 16#00#, 16#00#, 16#00#, 16#00#, 16#7F#, 16#00#, 16#00#, 16#00#, 16#00#, 16#0F#, 16#E0#, 16#00#, 16#00#, 16#00#, 16#00#, 16#F8#, 16#00#, 16#00#, 16#00#, 16#00#, 16#1F#, 16#00#, 16#00#, 16#00#, 16#00#, 16#03#, 16#C0#, 16#00#, 16#00#, 16#00#, 16#00#, 16#78#, 16#00#, 16#00#, 16#00#, 16#00#, 16#06#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#E0#, 16#00#, 16#00#, 16#00#, 16#00#, 16#0C#, 16#00#, 16#00#, 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#78#, 16#00#, 16#00#, 16#00#, 16#00#, 16#0F#, 16#C0#, 16#00#, 16#00#, 16#00#, 16#00#, 16#FE#, 16#00#, 16#00#, 16#00#, 16#00#, 16#0F#, 16#E0#, 16#00#, 16#00#, 16#00#, 16#00#, 16#FE#, 16#00#, 16#00#, 16#00#, 16#00#, 16#0F#, 16#C0#, 16#00#, 16#00#, 16#00#, 16#00#, 16#78#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#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#00#, 16#07#, 16#FF#, 16#F0#, 16#00#, 16#00#, 16#01#, 16#F8#, 16#07#, 16#C0#, 16#00#, 16#00#, 16#3C#, 16#00#, 16#1E#, 16#00#, 16#00#, 16#0F#, 16#80#, 16#00#, 16#70#, 16#00#, 16#01#, 16#F0#, 16#00#, 16#03#, 16#80#, 16#00#, 16#3E#, 16#00#, 16#00#, 16#1C#, 16#00#, 16#03#, 16#C0#, 16#07#, 16#04#, 16#E0#, 16#00#, 16#7C#, 16#01#, 16#FB#, 16#C6#, 16#00#, 16#0F#, 16#80#, 16#3C#, 16#FC#, 16#70#, 16#00#, 16#F8#, 16#07#, 16#87#, 16#87#, 16#00#, 16#0F#, 16#00#, 16#F8#, 16#78#, 16#30#, 16#01#, 16#F0#, 16#1F#, 16#07#, 16#83#, 16#00#, 16#1F#, 16#01#, 16#E0#, 16#F8#, 16#30#, 16#01#, 16#F0#, 16#3E#, 16#0F#, 16#03#, 16#00#, 16#1F#, 16#03#, 16#C0#, 16#F0#, 16#30#, 16#01#, 16#F0#, 16#7C#, 16#1F#, 16#03#, 16#00#, 16#1F#, 16#07#, 16#C1#, 16#E0#, 16#30#, 16#01#, 16#F0#, 16#7C#, 16#1E#, 16#07#, 16#00#, 16#1F#, 16#07#, 16#83#, 16#E0#, 16#60#, 16#01#, 16#F0#, 16#78#, 16#5E#, 16#0E#, 16#00#, 16#0F#, 16#07#, 16#CF#, 16#E1#, 16#C0#, 16#00#, 16#F8#, 16#3F#, 16#BE#, 16#38#, 16#00#, 16#0F#, 16#81#, 16#E1#, 16#FF#, 16#00#, 16#00#, 16#78#, 16#00#, 16#0F#, 16#C0#, 16#00#, 16#03#, 16#C0#, 16#00#, 16#00#, 16#00#, 16#00#, 16#3E#, 16#00#, 16#00#, 16#00#, 16#00#, 16#01#, 16#F0#, 16#00#, 16#00#, 16#00#, 16#00#, 16#0F#, 16#80#, 16#00#, 16#00#, 16#00#, 16#00#, 16#3E#, 16#00#, 16#06#, 16#00#, 16#00#, 16#01#, 16#F8#, 16#03#, 16#E0#, 16#00#, 16#00#, 16#07#, 16#FF#, 16#F8#, 16#00#, 16#00#, 16#00#, 16#0F#, 16#FC#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#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#00#, 16#0E#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#E0#, 16#00#, 16#00#, 16#00#, 16#00#, 16#1E#, 16#00#, 16#00#, 16#00#, 16#00#, 16#01#, 16#E0#, 16#00#, 16#00#, 16#00#, 16#00#, 16#3E#, 16#00#, 16#00#, 16#00#, 16#00#, 16#07#, 16#F0#, 16#00#, 16#00#, 16#00#, 16#00#, 16#7F#, 16#00#, 16#00#, 16#00#, 16#00#, 16#0F#, 16#F0#, 16#00#, 16#00#, 16#00#, 16#01#, 16#BF#, 16#00#, 16#00#, 16#00#, 16#00#, 16#1B#, 16#F0#, 16#00#, 16#00#, 16#00#, 16#03#, 16#3F#, 16#00#, 16#00#, 16#00#, 16#00#, 16#63#, 16#F8#, 16#00#, 16#00#, 16#00#, 16#06#, 16#3F#, 16#80#, 16#00#, 16#00#, 16#00#, 16#C1#, 16#F8#, 16#00#, 16#00#, 16#00#, 16#0C#, 16#1F#, 16#80#, 16#00#, 16#00#, 16#01#, 16#81#, 16#F8#, 16#00#, 16#00#, 16#00#, 16#30#, 16#1F#, 16#80#, 16#00#, 16#00#, 16#03#, 16#01#, 16#FC#, 16#00#, 16#00#, 16#00#, 16#60#, 16#1F#, 16#C0#, 16#00#, 16#00#, 16#0F#, 16#FF#, 16#FC#, 16#00#, 16#00#, 16#00#, 16#FF#, 16#FF#, 16#C0#, 16#00#, 16#00#, 16#18#, 16#00#, 16#FC#, 16#00#, 16#00#, 16#01#, 16#80#, 16#0F#, 16#C0#, 16#00#, 16#00#, 16#30#, 16#00#, 16#FE#, 16#00#, 16#00#, 16#07#, 16#00#, 16#0F#, 16#E0#, 16#00#, 16#00#, 16#60#, 16#00#, 16#FE#, 16#00#, 16#00#, 16#0E#, 16#00#, 16#0F#, 16#E0#, 16#00#, 16#01#, 16#C0#, 16#00#, 16#FE#, 16#00#, 16#00#, 16#1C#, 16#00#, 16#0F#, 16#F0#, 16#00#, 16#07#, 16#E0#, 16#01#, 16#FF#, 16#80#, 16#00#, 16#FF#, 16#80#, 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#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#01#, 16#FF#, 16#FF#, 16#00#, 16#00#, 16#00#, 16#07#, 16#FF#, 16#FE#, 16#00#, 16#00#, 16#00#, 16#3F#, 16#83#, 16#F8#, 16#00#, 16#00#, 16#03#, 16#F8#, 16#1F#, 16#80#, 16#00#, 16#00#, 16#3F#, 16#81#, 16#FC#, 16#00#, 16#00#, 16#07#, 16#F0#, 16#1F#, 16#C0#, 16#00#, 16#00#, 16#7F#, 16#00#, 16#FC#, 16#00#, 16#00#, 16#07#, 16#F0#, 16#1F#, 16#C0#, 16#00#, 16#00#, 16#7F#, 16#01#, 16#FC#, 16#00#, 16#00#, 16#0F#, 16#E0#, 16#1F#, 16#C0#, 16#00#, 16#00#, 16#FE#, 16#01#, 16#F8#, 16#00#, 16#00#, 16#0F#, 16#E0#, 16#3F#, 16#80#, 16#00#, 16#00#, 16#FE#, 16#07#, 16#E0#, 16#00#, 16#00#, 16#1F#, 16#C3#, 16#F8#, 16#00#, 16#00#, 16#01#, 16#FF#, 16#FC#, 16#00#, 16#00#, 16#00#, 16#1F#, 16#C3#, 16#F0#, 16#00#, 16#00#, 16#03#, 16#F8#, 16#0F#, 16#C0#, 16#00#, 16#00#, 16#3F#, 16#80#, 16#FE#, 16#00#, 16#00#, 16#03#, 16#F8#, 16#07#, 16#F0#, 16#00#, 16#00#, 16#3F#, 16#80#, 16#7F#, 16#00#, 16#00#, 16#07#, 16#F0#, 16#07#, 16#F0#, 16#00#, 16#00#, 16#7F#, 16#00#, 16#7F#, 16#00#, 16#00#, 16#07#, 16#F0#, 16#07#, 16#F0#, 16#00#, 16#00#, 16#7F#, 16#00#, 16#FF#, 16#00#, 16#00#, 16#0F#, 16#E0#, 16#0F#, 16#E0#, 16#00#, 16#00#, 16#FE#, 16#01#, 16#FE#, 16#00#, 16#00#, 16#0F#, 16#E0#, 16#1F#, 16#C0#, 16#00#, 16#01#, 16#FC#, 16#03#, 16#F8#, 16#00#, 16#00#, 16#1F#, 16#E0#, 16#FF#, 16#00#, 16#00#, 16#03#, 16#FF#, 16#FF#, 16#C0#, 16#00#, 16#00#, 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#07#, 16#F8#, 16#10#, 16#00#, 16#00#, 16#03#, 16#FF#, 16#F7#, 16#00#, 16#00#, 16#00#, 16#FF#, 16#07#, 16#F0#, 16#00#, 16#00#, 16#1F#, 16#C0#, 16#3E#, 16#00#, 16#00#, 16#07#, 16#F8#, 16#01#, 16#E0#, 16#00#, 16#00#, 16#FF#, 16#00#, 16#0E#, 16#00#, 16#00#, 16#1F#, 16#E0#, 16#00#, 16#E0#, 16#00#, 16#03#, 16#FC#, 16#00#, 16#0E#, 16#00#, 16#00#, 16#3F#, 16#80#, 16#00#, 16#C0#, 16#00#, 16#07#, 16#F8#, 16#00#, 16#0C#, 16#00#, 16#00#, 16#FF#, 16#00#, 16#00#, 16#C0#, 16#00#, 16#0F#, 16#F0#, 16#00#, 16#00#, 16#00#, 16#00#, 16#FE#, 16#00#, 16#00#, 16#00#, 16#00#, 16#1F#, 16#E0#, 16#00#, 16#00#, 16#00#, 16#01#, 16#FE#, 16#00#, 16#00#, 16#00#, 16#00#, 16#1F#, 16#C0#, 16#00#, 16#00#, 16#00#, 16#03#, 16#FC#, 16#00#, 16#00#, 16#00#, 16#00#, 16#3F#, 16#C0#, 16#00#, 16#00#, 16#00#, 16#03#, 16#FC#, 16#00#, 16#00#, 16#00#, 16#00#, 16#3F#, 16#80#, 16#00#, 16#00#, 16#00#, 16#03#, 16#F8#, 16#00#, 16#00#, 16#00#, 16#00#, 16#3F#, 16#80#, 16#00#, 16#00#, 16#00#, 16#03#, 16#F8#, 16#00#, 16#00#, 16#00#, 16#00#, 16#3F#, 16#80#, 16#00#, 16#00#, 16#00#, 16#03#, 16#F8#, 16#00#, 16#00#, 16#00#, 16#00#, 16#1F#, 16#80#, 16#00#, 16#00#, 16#00#, 16#01#, 16#FC#, 16#00#, 16#06#, 16#00#, 16#00#, 16#0F#, 16#C0#, 16#00#, 16#E0#, 16#00#, 16#00#, 16#FE#, 16#00#, 16#1C#, 16#00#, 16#00#, 16#07#, 16#F0#, 16#03#, 16#80#, 16#00#, 16#00#, 16#3F#, 16#81#, 16#E0#, 16#00#, 16#00#, 16#00#, 16#FF#, 16#FC#, 16#00#, 16#00#, 16#00#, 16#01#, 16#FE#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#01#, 16#FF#, 16#FF#, 16#80#, 16#00#, 16#00#, 16#1F#, 16#FF#, 16#FF#, 16#00#, 16#00#, 16#00#, 16#3F#, 16#81#, 16#F8#, 16#00#, 16#00#, 16#03#, 16#F8#, 16#07#, 16#E0#, 16#00#, 16#00#, 16#3F#, 16#80#, 16#3F#, 16#00#, 16#00#, 16#07#, 16#F0#, 16#01#, 16#F0#, 16#00#, 16#00#, 16#7F#, 16#00#, 16#1F#, 16#80#, 16#00#, 16#07#, 16#F0#, 16#01#, 16#F8#, 16#00#, 16#00#, 16#7F#, 16#00#, 16#1F#, 16#C0#, 16#00#, 16#0F#, 16#E0#, 16#01#, 16#FC#, 16#00#, 16#00#, 16#FE#, 16#00#, 16#1F#, 16#C0#, 16#00#, 16#0F#, 16#E0#, 16#01#, 16#FC#, 16#00#, 16#00#, 16#FE#, 16#00#, 16#1F#, 16#C0#, 16#00#, 16#1F#, 16#C0#, 16#01#, 16#FC#, 16#00#, 16#01#, 16#FC#, 16#00#, 16#1F#, 16#C0#, 16#00#, 16#1F#, 16#C0#, 16#01#, 16#FC#, 16#00#, 16#03#, 16#F8#, 16#00#, 16#1F#, 16#C0#, 16#00#, 16#3F#, 16#80#, 16#03#, 16#FC#, 16#00#, 16#03#, 16#F8#, 16#00#, 16#3F#, 16#80#, 16#00#, 16#3F#, 16#80#, 16#03#, 16#F8#, 16#00#, 16#07#, 16#F0#, 16#00#, 16#7F#, 16#80#, 16#00#, 16#7F#, 16#00#, 16#07#, 16#F0#, 16#00#, 16#07#, 16#F0#, 16#00#, 16#FE#, 16#00#, 16#00#, 16#7F#, 16#00#, 16#0F#, 16#E0#, 16#00#, 16#0F#, 16#E0#, 16#01#, 16#FC#, 16#00#, 16#00#, 16#FE#, 16#00#, 16#3F#, 16#80#, 16#00#, 16#0F#, 16#E0#, 16#07#, 16#F0#, 16#00#, 16#01#, 16#FE#, 16#01#, 16#FC#, 16#00#, 16#00#, 16#1F#, 16#E0#, 16#7F#, 16#00#, 16#00#, 16#03#, 16#FF#, 16#FF#, 16#C0#, 16#00#, 16#00#, 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#01#, 16#FF#, 16#FF#, 16#FF#, 16#00#, 16#00#, 16#07#, 16#FF#, 16#FF#, 16#F0#, 16#00#, 16#00#, 16#3F#, 16#C0#, 16#7E#, 16#00#, 16#00#, 16#03#, 16#F8#, 16#01#, 16#E0#, 16#00#, 16#00#, 16#3F#, 16#80#, 16#0E#, 16#00#, 16#00#, 16#07#, 16#F0#, 16#00#, 16#E0#, 16#00#, 16#00#, 16#7F#, 16#00#, 16#04#, 16#00#, 16#00#, 16#07#, 16#F0#, 16#00#, 16#40#, 16#00#, 16#00#, 16#7F#, 16#00#, 16#00#, 16#00#, 16#00#, 16#0F#, 16#E0#, 16#18#, 16#00#, 16#00#, 16#00#, 16#FE#, 16#01#, 16#80#, 16#00#, 16#00#, 16#0F#, 16#E0#, 16#30#, 16#00#, 16#00#, 16#00#, 16#FC#, 16#0F#, 16#00#, 16#00#, 16#00#, 16#1F#, 16#FF#, 16#F0#, 16#00#, 16#00#, 16#01#, 16#FF#, 16#FF#, 16#00#, 16#00#, 16#00#, 16#1F#, 16#C3#, 16#E0#, 16#00#, 16#00#, 16#03#, 16#F8#, 16#0E#, 16#00#, 16#00#, 16#00#, 16#3F#, 16#80#, 16#E0#, 16#00#, 16#00#, 16#03#, 16#F8#, 16#0C#, 16#00#, 16#00#, 16#00#, 16#3F#, 16#80#, 16#40#, 16#00#, 16#00#, 16#07#, 16#F0#, 16#0C#, 16#00#, 16#00#, 16#00#, 16#7F#, 16#00#, 16#00#, 16#00#, 16#00#, 16#07#, 16#F0#, 16#00#, 16#18#, 16#00#, 16#00#, 16#7F#, 16#00#, 16#03#, 16#00#, 16#00#, 16#0F#, 16#E0#, 16#00#, 16#70#, 16#00#, 16#00#, 16#FE#, 16#00#, 16#0F#, 16#00#, 16#00#, 16#0F#, 16#E0#, 16#01#, 16#E0#, 16#00#, 16#01#, 16#FC#, 16#00#, 16#7E#, 16#00#, 16#00#, 16#1F#, 16#E0#, 16#3F#, 16#E0#, 16#00#, 16#03#, 16#FF#, 16#FF#, 16#FC#, 16#00#, 16#00#, 16#FF#, 16#FF#, 16#FF#, 16#C0#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#01#, 16#FF#, 16#FF#, 16#FF#, 16#00#, 16#00#, 16#07#, 16#FF#, 16#FF#, 16#E0#, 16#00#, 16#00#, 16#3F#, 16#C0#, 16#7E#, 16#00#, 16#00#, 16#03#, 16#F8#, 16#01#, 16#E0#, 16#00#, 16#00#, 16#3F#, 16#80#, 16#1E#, 16#00#, 16#00#, 16#07#, 16#F0#, 16#00#, 16#C0#, 16#00#, 16#00#, 16#7F#, 16#00#, 16#0C#, 16#00#, 16#00#, 16#07#, 16#F0#, 16#00#, 16#C0#, 16#00#, 16#00#, 16#7F#, 16#00#, 16#00#, 16#00#, 16#00#, 16#0F#, 16#E0#, 16#18#, 16#00#, 16#00#, 16#00#, 16#FE#, 16#03#, 16#00#, 16#00#, 16#00#, 16#0F#, 16#E0#, 16#70#, 16#00#, 16#00#, 16#00#, 16#FC#, 16#0F#, 16#00#, 16#00#, 16#00#, 16#1F#, 16#FF#, 16#F0#, 16#00#, 16#00#, 16#01#, 16#FF#, 16#FE#, 16#00#, 16#00#, 16#00#, 16#1F#, 16#C3#, 16#E0#, 16#00#, 16#00#, 16#03#, 16#F8#, 16#1E#, 16#00#, 16#00#, 16#00#, 16#3F#, 16#80#, 16#C0#, 16#00#, 16#00#, 16#03#, 16#F8#, 16#0C#, 16#00#, 16#00#, 16#00#, 16#3F#, 16#80#, 16#C0#, 16#00#, 16#00#, 16#07#, 16#F0#, 16#0C#, 16#00#, 16#00#, 16#00#, 16#7F#, 16#00#, 16#80#, 16#00#, 16#00#, 16#07#, 16#F0#, 16#00#, 16#00#, 16#00#, 16#00#, 16#7F#, 16#00#, 16#00#, 16#00#, 16#00#, 16#0F#, 16#E0#, 16#00#, 16#00#, 16#00#, 16#00#, 16#FE#, 16#00#, 16#00#, 16#00#, 16#00#, 16#0F#, 16#E0#, 16#00#, 16#00#, 16#00#, 16#01#, 16#FE#, 16#00#, 16#00#, 16#00#, 16#00#, 16#1F#, 16#E0#, 16#00#, 16#00#, 16#00#, 16#03#, 16#FE#, 16#00#, 16#00#, 16#00#, 16#00#, 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#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#03#, 16#FC#, 16#18#, 16#00#, 16#00#, 16#03#, 16#FF#, 16#FB#, 16#80#, 16#00#, 16#00#, 16#FF#, 16#03#, 16#F8#, 16#00#, 16#00#, 16#1F#, 16#C0#, 16#1F#, 16#00#, 16#00#, 16#03#, 16#F8#, 16#00#, 16#F0#, 16#00#, 16#00#, 16#FF#, 16#00#, 16#07#, 16#00#, 16#00#, 16#1F#, 16#E0#, 16#00#, 16#70#, 16#00#, 16#01#, 16#FC#, 16#00#, 16#06#, 16#00#, 16#00#, 16#3F#, 16#80#, 16#00#, 16#60#, 16#00#, 16#07#, 16#F8#, 16#00#, 16#06#, 16#00#, 16#00#, 16#7F#, 16#00#, 16#00#, 16#00#, 16#00#, 16#0F#, 16#F0#, 16#00#, 16#00#, 16#00#, 16#00#, 16#FE#, 16#00#, 16#00#, 16#00#, 16#00#, 16#1F#, 16#E0#, 16#00#, 16#00#, 16#00#, 16#01#, 16#FE#, 16#00#, 16#00#, 16#00#, 16#00#, 16#1F#, 16#C0#, 16#00#, 16#00#, 16#00#, 16#03#, 16#FC#, 16#00#, 16#00#, 16#00#, 16#00#, 16#3F#, 16#C0#, 16#07#, 16#FF#, 16#C0#, 16#03#, 16#FC#, 16#00#, 16#1F#, 16#F0#, 16#00#, 16#3F#, 16#C0#, 16#00#, 16#FE#, 16#00#, 16#03#, 16#F8#, 16#00#, 16#0F#, 16#E0#, 16#00#, 16#3F#, 16#80#, 16#00#, 16#FE#, 16#00#, 16#03#, 16#F8#, 16#00#, 16#0F#, 16#C0#, 16#00#, 16#3F#, 16#80#, 16#01#, 16#FC#, 16#00#, 16#01#, 16#FC#, 16#00#, 16#1F#, 16#C0#, 16#00#, 16#1F#, 16#C0#, 16#01#, 16#FC#, 16#00#, 16#00#, 16#FC#, 16#00#, 16#1F#, 16#80#, 16#00#, 16#0F#, 16#C0#, 16#03#, 16#F8#, 16#00#, 16#00#, 16#7E#, 16#00#, 16#3F#, 16#80#, 16#00#, 16#03#, 16#F0#, 16#03#, 16#F0#, 16#00#, 16#00#, 16#1F#, 16#C0#, 16#FE#, 16#00#, 16#00#, 16#00#, 16#7F#, 16#FF#, 16#80#, 16#00#, 16#00#, 16#00#, 16#FF#, 16#80#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#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#F8#, 16#7F#, 16#FE#, 16#00#, 16#07#, 16#FE#, 16#01#, 16#FF#, 16#80#, 16#00#, 16#3F#, 16#80#, 16#0F#, 16#F0#, 16#00#, 16#03#, 16#F8#, 16#00#, 16#FE#, 16#00#, 16#00#, 16#3F#, 16#80#, 16#0F#, 16#E0#, 16#00#, 16#07#, 16#F0#, 16#00#, 16#FE#, 16#00#, 16#00#, 16#7F#, 16#00#, 16#1F#, 16#C0#, 16#00#, 16#07#, 16#F0#, 16#01#, 16#FC#, 16#00#, 16#00#, 16#7F#, 16#00#, 16#1F#, 16#C0#, 16#00#, 16#0F#, 16#E0#, 16#01#, 16#F8#, 16#00#, 16#00#, 16#FE#, 16#00#, 16#3F#, 16#80#, 16#00#, 16#0F#, 16#E0#, 16#03#, 16#F8#, 16#00#, 16#00#, 16#FE#, 16#00#, 16#3F#, 16#80#, 16#00#, 16#1F#, 16#C0#, 16#03#, 16#F0#, 16#00#, 16#01#, 16#FF#, 16#FF#, 16#FF#, 16#00#, 16#00#, 16#1F#, 16#FF#, 16#FF#, 16#F0#, 16#00#, 16#03#, 16#F8#, 16#00#, 16#7E#, 16#00#, 16#00#, 16#3F#, 16#80#, 16#0F#, 16#E0#, 16#00#, 16#03#, 16#F8#, 16#00#, 16#FE#, 16#00#, 16#00#, 16#3F#, 16#80#, 16#0F#, 16#E0#, 16#00#, 16#07#, 16#F0#, 16#00#, 16#FC#, 16#00#, 16#00#, 16#7F#, 16#00#, 16#1F#, 16#C0#, 16#00#, 16#07#, 16#F0#, 16#01#, 16#FC#, 16#00#, 16#00#, 16#7E#, 16#00#, 16#1F#, 16#C0#, 16#00#, 16#0F#, 16#E0#, 16#03#, 16#F8#, 16#00#, 16#00#, 16#FE#, 16#00#, 16#3F#, 16#80#, 16#00#, 16#0F#, 16#E0#, 16#03#, 16#F8#, 16#00#, 16#01#, 16#FE#, 16#00#, 16#7F#, 16#80#, 16#00#, 16#1F#, 16#E0#, 16#07#, 16#F8#, 16#00#, 16#03#, 16#FE#, 16#00#, 16#FF#, 16#80#, 16#00#, 16#FF#, 16#FC#, 16#7F#, 16#FF#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#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#F8#, 16#00#, 16#00#, 16#00#, 16#07#, 16#FE#, 16#00#, 16#00#, 16#00#, 16#00#, 16#3F#, 16#80#, 16#00#, 16#00#, 16#00#, 16#03#, 16#F8#, 16#00#, 16#00#, 16#00#, 16#00#, 16#3F#, 16#80#, 16#00#, 16#00#, 16#00#, 16#07#, 16#F0#, 16#00#, 16#00#, 16#00#, 16#00#, 16#7F#, 16#00#, 16#00#, 16#00#, 16#00#, 16#07#, 16#F0#, 16#00#, 16#00#, 16#00#, 16#00#, 16#7F#, 16#00#, 16#00#, 16#00#, 16#00#, 16#0F#, 16#E0#, 16#00#, 16#00#, 16#00#, 16#00#, 16#FE#, 16#00#, 16#00#, 16#00#, 16#00#, 16#0F#, 16#E0#, 16#00#, 16#00#, 16#00#, 16#00#, 16#FC#, 16#00#, 16#00#, 16#00#, 16#00#, 16#1F#, 16#C0#, 16#00#, 16#00#, 16#00#, 16#01#, 16#FC#, 16#00#, 16#00#, 16#00#, 16#00#, 16#1F#, 16#C0#, 16#00#, 16#00#, 16#00#, 16#03#, 16#F8#, 16#00#, 16#00#, 16#00#, 16#00#, 16#3F#, 16#80#, 16#00#, 16#00#, 16#00#, 16#03#, 16#F8#, 16#00#, 16#00#, 16#00#, 16#00#, 16#3F#, 16#80#, 16#00#, 16#00#, 16#00#, 16#07#, 16#F0#, 16#00#, 16#00#, 16#00#, 16#00#, 16#7F#, 16#00#, 16#00#, 16#00#, 16#00#, 16#07#, 16#F0#, 16#00#, 16#00#, 16#00#, 16#00#, 16#7E#, 16#00#, 16#00#, 16#00#, 16#00#, 16#0F#, 16#E0#, 16#00#, 16#00#, 16#00#, 16#00#, 16#FE#, 16#00#, 16#00#, 16#00#, 16#00#, 16#0F#, 16#E0#, 16#00#, 16#00#, 16#00#, 16#01#, 16#FE#, 16#00#, 16#00#, 16#00#, 16#00#, 16#1F#, 16#E0#, 16#00#, 16#00#, 16#00#, 16#03#, 16#FE#, 16#00#, 16#00#, 16#00#, 16#00#, 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#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#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#00#, 16#00#, 16#1F#, 16#F8#, 16#00#, 16#00#, 16#00#, 16#00#, 16#FF#, 16#00#, 16#00#, 16#00#, 16#00#, 16#0F#, 16#E0#, 16#00#, 16#00#, 16#00#, 16#00#, 16#FE#, 16#00#, 16#00#, 16#00#, 16#00#, 16#0F#, 16#E0#, 16#00#, 16#00#, 16#00#, 16#01#, 16#FC#, 16#00#, 16#00#, 16#00#, 16#00#, 16#1F#, 16#C0#, 16#00#, 16#00#, 16#00#, 16#01#, 16#FC#, 16#00#, 16#00#, 16#00#, 16#00#, 16#1F#, 16#C0#, 16#00#, 16#00#, 16#00#, 16#03#, 16#F8#, 16#00#, 16#00#, 16#00#, 16#00#, 16#3F#, 16#80#, 16#00#, 16#00#, 16#00#, 16#03#, 16#F8#, 16#00#, 16#00#, 16#00#, 16#00#, 16#3F#, 16#00#, 16#00#, 16#00#, 16#00#, 16#07#, 16#F0#, 16#00#, 16#00#, 16#00#, 16#00#, 16#7F#, 16#00#, 16#00#, 16#00#, 16#00#, 16#07#, 16#F0#, 16#00#, 16#00#, 16#00#, 16#00#, 16#7E#, 16#00#, 16#00#, 16#00#, 16#00#, 16#0F#, 16#E0#, 16#00#, 16#00#, 16#00#, 16#00#, 16#FE#, 16#00#, 16#00#, 16#00#, 16#00#, 16#0F#, 16#E0#, 16#00#, 16#00#, 16#00#, 16#01#, 16#FC#, 16#00#, 16#00#, 16#00#, 16#00#, 16#1F#, 16#C0#, 16#00#, 16#00#, 16#00#, 16#01#, 16#FC#, 16#00#, 16#00#, 16#00#, 16#00#, 16#1F#, 16#C0#, 16#00#, 16#00#, 16#00#, 16#03#, 16#F8#, 16#00#, 16#00#, 16#00#, 16#00#, 16#3F#, 16#80#, 16#00#, 16#00#, 16#00#, 16#03#, 16#F8#, 16#00#, 16#00#, 16#00#, 16#78#, 16#3F#, 16#00#, 16#00#, 16#00#, 16#0F#, 16#C7#, 16#F0#, 16#00#, 16#00#, 16#00#, 16#FC#, 16#7F#, 16#00#, 16#00#, 16#00#, 16#0F#, 16#C7#, 16#E0#, 16#00#, 16#00#, 16#00#, 16#F8#, 16#FC#, 16#00#, 16#00#, 16#00#, 16#07#, 16#9F#, 16#C0#, 16#00#, 16#00#, 16#00#, 16#3F#, 16#F0#, 16#00#, 16#00#, 16#00#, 16#00#, 16#FC#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#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#F8#, 16#FF#, 16#C0#, 16#00#, 16#07#, 16#FE#, 16#03#, 16#F0#, 16#00#, 16#00#, 16#3F#, 16#80#, 16#1C#, 16#00#, 16#00#, 16#03#, 16#F8#, 16#03#, 16#80#, 16#00#, 16#00#, 16#3F#, 16#80#, 16#70#, 16#00#, 16#00#, 16#07#, 16#F0#, 16#0E#, 16#00#, 16#00#, 16#00#, 16#7F#, 16#01#, 16#C0#, 16#00#, 16#00#, 16#07#, 16#F0#, 16#38#, 16#00#, 16#00#, 16#00#, 16#7F#, 16#07#, 16#00#, 16#00#, 16#00#, 16#0F#, 16#E0#, 16#E0#, 16#00#, 16#00#, 16#00#, 16#FE#, 16#1C#, 16#00#, 16#00#, 16#00#, 16#0F#, 16#E3#, 16#80#, 16#00#, 16#00#, 16#00#, 16#FC#, 16#60#, 16#00#, 16#00#, 16#00#, 16#1F#, 16#DF#, 16#00#, 16#00#, 16#00#, 16#01#, 16#FF#, 16#F0#, 16#00#, 16#00#, 16#00#, 16#1F#, 16#FF#, 16#80#, 16#00#, 16#00#, 16#03#, 16#FB#, 16#F8#, 16#00#, 16#00#, 16#00#, 16#3F#, 16#9F#, 16#C0#, 16#00#, 16#00#, 16#03#, 16#F9#, 16#FC#, 16#00#, 16#00#, 16#00#, 16#3F#, 16#8F#, 16#E0#, 16#00#, 16#00#, 16#07#, 16#F0#, 16#FE#, 16#00#, 16#00#, 16#00#, 16#7F#, 16#07#, 16#F0#, 16#00#, 16#00#, 16#07#, 16#F0#, 16#7F#, 16#00#, 16#00#, 16#00#, 16#7E#, 16#03#, 16#F8#, 16#00#, 16#00#, 16#0F#, 16#E0#, 16#3F#, 16#80#, 16#00#, 16#00#, 16#FE#, 16#03#, 16#F8#, 16#00#, 16#00#, 16#0F#, 16#E0#, 16#1F#, 16#C0#, 16#00#, 16#01#, 16#FE#, 16#01#, 16#FC#, 16#00#, 16#00#, 16#1F#, 16#E0#, 16#0F#, 16#E0#, 16#00#, 16#03#, 16#FE#, 16#01#, 16#FF#, 16#00#, 16#00#, 16#FF#, 16#FC#, 16#7F#, 16#FC#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#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#F8#, 16#00#, 16#00#, 16#00#, 16#07#, 16#FE#, 16#00#, 16#00#, 16#00#, 16#00#, 16#3F#, 16#80#, 16#00#, 16#00#, 16#00#, 16#03#, 16#F8#, 16#00#, 16#00#, 16#00#, 16#00#, 16#3F#, 16#80#, 16#00#, 16#00#, 16#00#, 16#07#, 16#F0#, 16#00#, 16#00#, 16#00#, 16#00#, 16#7F#, 16#00#, 16#00#, 16#00#, 16#00#, 16#07#, 16#F0#, 16#00#, 16#00#, 16#00#, 16#00#, 16#7F#, 16#00#, 16#00#, 16#00#, 16#00#, 16#0F#, 16#E0#, 16#00#, 16#00#, 16#00#, 16#00#, 16#FE#, 16#00#, 16#00#, 16#00#, 16#00#, 16#0F#, 16#E0#, 16#00#, 16#00#, 16#00#, 16#00#, 16#FC#, 16#00#, 16#00#, 16#00#, 16#00#, 16#1F#, 16#C0#, 16#00#, 16#00#, 16#00#, 16#01#, 16#FC#, 16#00#, 16#00#, 16#00#, 16#00#, 16#1F#, 16#C0#, 16#00#, 16#00#, 16#00#, 16#03#, 16#F8#, 16#00#, 16#00#, 16#00#, 16#00#, 16#3F#, 16#80#, 16#00#, 16#00#, 16#00#, 16#03#, 16#F8#, 16#00#, 16#00#, 16#00#, 16#00#, 16#3F#, 16#80#, 16#00#, 16#00#, 16#00#, 16#07#, 16#F0#, 16#00#, 16#00#, 16#00#, 16#00#, 16#7F#, 16#00#, 16#00#, 16#00#, 16#00#, 16#07#, 16#F0#, 16#00#, 16#18#, 16#00#, 16#00#, 16#7F#, 16#00#, 16#03#, 16#00#, 16#00#, 16#0F#, 16#E0#, 16#00#, 16#70#, 16#00#, 16#00#, 16#FE#, 16#00#, 16#0F#, 16#00#, 16#00#, 16#0F#, 16#E0#, 16#01#, 16#E0#, 16#00#, 16#01#, 16#FC#, 16#00#, 16#7E#, 16#00#, 16#00#, 16#1F#, 16#E0#, 16#3F#, 16#E0#, 16#00#, 16#03#, 16#FF#, 16#FF#, 16#FC#, 16#00#, 16#00#, 16#FF#, 16#FF#, 16#FF#, 16#C0#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#01#, 16#FF#, 16#80#, 16#00#, 16#3F#, 16#F0#, 16#03#, 16#FC#, 16#00#, 16#07#, 16#FE#, 16#00#, 16#3F#, 16#C0#, 16#00#, 16#7F#, 16#80#, 16#03#, 16#FC#, 16#00#, 16#0F#, 16#F8#, 16#00#, 16#3F#, 16#C0#, 16#00#, 16#FF#, 16#80#, 16#03#, 16#FC#, 16#00#, 16#1F#, 16#F0#, 16#00#, 16#6F#, 16#C0#, 16#03#, 16#FF#, 16#00#, 16#06#, 16#FC#, 16#00#, 16#37#, 16#F0#, 16#00#, 16#6F#, 16#C0#, 16#06#, 16#7E#, 16#00#, 16#06#, 16#FC#, 16#00#, 16#EF#, 16#E0#, 16#00#, 16#CF#, 16#E0#, 16#0C#, 16#FE#, 16#00#, 16#0C#, 16#FE#, 16#01#, 16#8F#, 16#E0#, 16#00#, 16#CF#, 16#E0#, 16#38#, 16#FC#, 16#00#, 16#18#, 16#7E#, 16#03#, 16#1F#, 16#C0#, 16#01#, 16#87#, 16#E0#, 16#61#, 16#FC#, 16#00#, 16#18#, 16#7E#, 16#0E#, 16#1F#, 16#C0#, 16#01#, 16#87#, 16#E0#, 16#C3#, 16#F8#, 16#00#, 16#30#, 16#7E#, 16#18#, 16#3F#, 16#80#, 16#03#, 16#07#, 16#F3#, 16#83#, 16#F8#, 16#00#, 16#30#, 16#7F#, 16#30#, 16#3F#, 16#00#, 16#06#, 16#07#, 16#F7#, 16#07#, 16#F0#, 16#00#, 16#60#, 16#3F#, 16#E0#, 16#7F#, 16#00#, 16#06#, 16#03#, 16#FC#, 16#07#, 16#F0#, 16#00#, 16#E0#, 16#3F#, 16#C0#, 16#7E#, 16#00#, 16#0C#, 16#03#, 16#F8#, 16#0F#, 16#E0#, 16#00#, 16#C0#, 16#3F#, 16#00#, 16#FE#, 16#00#, 16#0C#, 16#03#, 16#F0#, 16#0F#, 16#E0#, 16#01#, 16#C0#, 16#3E#, 16#01#, 16#FC#, 16#00#, 16#1C#, 16#03#, 16#C0#, 16#1F#, 16#C0#, 16#07#, 16#E0#, 16#3C#, 16#03#, 16#FE#, 16#00#, 16#FF#, 16#C1#, 16#81#, 16#FF#, 16#FC#, 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#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#03#, 16#FF#, 16#00#, 16#1F#, 16#F0#, 16#00#, 16#07#, 16#F0#, 16#00#, 16#7E#, 16#00#, 16#00#, 16#3F#, 16#80#, 16#03#, 16#C0#, 16#00#, 16#03#, 16#F8#, 16#00#, 16#38#, 16#00#, 16#00#, 16#3F#, 16#C0#, 16#03#, 16#80#, 16#00#, 16#03#, 16#FC#, 16#00#, 16#30#, 16#00#, 16#00#, 16#6F#, 16#E0#, 16#03#, 16#00#, 16#00#, 16#06#, 16#FE#, 16#00#, 16#30#, 16#00#, 16#00#, 16#67#, 16#F0#, 16#06#, 16#00#, 16#00#, 16#06#, 16#7F#, 16#00#, 16#60#, 16#00#, 16#00#, 16#C3#, 16#F8#, 16#06#, 16#00#, 16#00#, 16#0C#, 16#3F#, 16#80#, 16#60#, 16#00#, 16#00#, 16#C1#, 16#FC#, 16#0C#, 16#00#, 16#00#, 16#18#, 16#1F#, 16#C0#, 16#C0#, 16#00#, 16#01#, 16#81#, 16#FC#, 16#0C#, 16#00#, 16#00#, 16#18#, 16#0F#, 16#E1#, 16#C0#, 16#00#, 16#01#, 16#80#, 16#FE#, 16#18#, 16#00#, 16#00#, 16#30#, 16#07#, 16#F1#, 16#80#, 16#00#, 16#03#, 16#00#, 16#7F#, 16#18#, 16#00#, 16#00#, 16#30#, 16#03#, 16#FB#, 16#00#, 16#00#, 16#06#, 16#00#, 16#3F#, 16#B0#, 16#00#, 16#00#, 16#60#, 16#01#, 16#FF#, 16#00#, 16#00#, 16#06#, 16#00#, 16#1F#, 16#F0#, 16#00#, 16#00#, 16#E0#, 16#00#, 16#FE#, 16#00#, 16#00#, 16#0C#, 16#00#, 16#0F#, 16#E0#, 16#00#, 16#00#, 16#C0#, 16#00#, 16#7E#, 16#00#, 16#00#, 16#0C#, 16#00#, 16#07#, 16#C0#, 16#00#, 16#01#, 16#C0#, 16#00#, 16#3C#, 16#00#, 16#00#, 16#1C#, 16#00#, 16#03#, 16#C0#, 16#00#, 16#07#, 16#E0#, 16#00#, 16#3C#, 16#00#, 16#00#, 16#FF#, 16#C0#, 16#01#, 16#80#, 16#00#, 16#00#, 16#00#, 16#00#, 16#18#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#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#00#, 16#01#, 16#FF#, 16#E0#, 16#00#, 16#00#, 16#00#, 16#7E#, 16#1F#, 16#80#, 16#00#, 16#00#, 16#1F#, 16#80#, 16#7C#, 16#00#, 16#00#, 16#03#, 16#F0#, 16#07#, 16#E0#, 16#00#, 16#00#, 16#7E#, 16#00#, 16#3F#, 16#00#, 16#00#, 16#0F#, 16#C0#, 16#03#, 16#F0#, 16#00#, 16#01#, 16#FC#, 16#00#, 16#3F#, 16#00#, 16#00#, 16#3F#, 16#80#, 16#03#, 16#F8#, 16#00#, 16#03#, 16#F8#, 16#00#, 16#3F#, 16#80#, 16#00#, 16#7F#, 16#00#, 16#03#, 16#F8#, 16#00#, 16#07#, 16#F0#, 16#00#, 16#3F#, 16#80#, 16#00#, 16#FE#, 16#00#, 16#03#, 16#F8#, 16#00#, 16#0F#, 16#E0#, 16#00#, 16#7F#, 16#80#, 16#01#, 16#FE#, 16#00#, 16#07#, 16#F8#, 16#00#, 16#1F#, 16#C0#, 16#00#, 16#7F#, 16#00#, 16#03#, 16#FC#, 16#00#, 16#07#, 16#F0#, 16#00#, 16#3F#, 16#C0#, 16#00#, 16#FF#, 16#00#, 16#03#, 16#F8#, 16#00#, 16#0F#, 16#E0#, 16#00#, 16#3F#, 16#80#, 16#00#, 16#FE#, 16#00#, 16#03#, 16#F8#, 16#00#, 16#1F#, 16#E0#, 16#00#, 16#3F#, 16#80#, 16#01#, 16#FC#, 16#00#, 16#03#, 16#F8#, 16#00#, 16#3F#, 16#80#, 16#00#, 16#3F#, 16#80#, 16#03#, 16#F8#, 16#00#, 16#03#, 16#F0#, 16#00#, 16#7F#, 16#00#, 16#00#, 16#3F#, 16#00#, 16#07#, 16#E0#, 16#00#, 16#01#, 16#F8#, 16#00#, 16#FE#, 16#00#, 16#00#, 16#1F#, 16#80#, 16#1F#, 16#C0#, 16#00#, 16#00#, 16#F8#, 16#03#, 16#F8#, 16#00#, 16#00#, 16#0F#, 16#C0#, 16#7E#, 16#00#, 16#00#, 16#00#, 16#7E#, 16#0F#, 16#C0#, 16#00#, 16#00#, 16#01#, 16#FF#, 16#F0#, 16#00#, 16#00#, 16#00#, 16#07#, 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#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#01#, 16#FF#, 16#FF#, 16#00#, 16#00#, 16#00#, 16#07#, 16#FF#, 16#FE#, 16#00#, 16#00#, 16#00#, 16#3F#, 16#87#, 16#F0#, 16#00#, 16#00#, 16#03#, 16#F8#, 16#3F#, 16#80#, 16#00#, 16#00#, 16#3F#, 16#81#, 16#FC#, 16#00#, 16#00#, 16#07#, 16#F0#, 16#1F#, 16#C0#, 16#00#, 16#00#, 16#7F#, 16#01#, 16#FC#, 16#00#, 16#00#, 16#07#, 16#F0#, 16#1F#, 16#C0#, 16#00#, 16#00#, 16#7F#, 16#01#, 16#FC#, 16#00#, 16#00#, 16#0F#, 16#E0#, 16#1F#, 16#C0#, 16#00#, 16#00#, 16#FE#, 16#03#, 16#FC#, 16#00#, 16#00#, 16#0F#, 16#E0#, 16#3F#, 16#80#, 16#00#, 16#00#, 16#FE#, 16#07#, 16#F8#, 16#00#, 16#00#, 16#1F#, 16#C0#, 16#7F#, 16#00#, 16#00#, 16#01#, 16#FC#, 16#1F#, 16#E0#, 16#00#, 16#00#, 16#1F#, 16#FF#, 16#F8#, 16#00#, 16#00#, 16#03#, 16#FF#, 16#FC#, 16#00#, 16#00#, 16#00#, 16#3F#, 16#80#, 16#00#, 16#00#, 16#00#, 16#03#, 16#F8#, 16#00#, 16#00#, 16#00#, 16#00#, 16#3F#, 16#80#, 16#00#, 16#00#, 16#00#, 16#07#, 16#F0#, 16#00#, 16#00#, 16#00#, 16#00#, 16#7F#, 16#00#, 16#00#, 16#00#, 16#00#, 16#07#, 16#F0#, 16#00#, 16#00#, 16#00#, 16#00#, 16#7E#, 16#00#, 16#00#, 16#00#, 16#00#, 16#0F#, 16#E0#, 16#00#, 16#00#, 16#00#, 16#00#, 16#FE#, 16#00#, 16#00#, 16#00#, 16#00#, 16#0F#, 16#E0#, 16#00#, 16#00#, 16#00#, 16#01#, 16#FC#, 16#00#, 16#00#, 16#00#, 16#00#, 16#1F#, 16#C0#, 16#00#, 16#00#, 16#00#, 16#03#, 16#FE#, 16#00#, 16#00#, 16#00#, 16#00#, 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#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#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#00#, 16#01#, 16#FF#, 16#E0#, 16#00#, 16#00#, 16#00#, 16#7E#, 16#1F#, 16#80#, 16#00#, 16#00#, 16#1F#, 16#80#, 16#7C#, 16#00#, 16#00#, 16#03#, 16#F0#, 16#07#, 16#E0#, 16#00#, 16#00#, 16#7E#, 16#00#, 16#3E#, 16#00#, 16#00#, 16#0F#, 16#C0#, 16#03#, 16#F0#, 16#00#, 16#01#, 16#FC#, 16#00#, 16#3F#, 16#00#, 16#00#, 16#3F#, 16#80#, 16#03#, 16#F0#, 16#00#, 16#03#, 16#F8#, 16#00#, 16#3F#, 16#80#, 16#00#, 16#7F#, 16#00#, 16#03#, 16#F8#, 16#00#, 16#0F#, 16#F0#, 16#00#, 16#3F#, 16#80#, 16#00#, 16#FE#, 16#00#, 16#07#, 16#F8#, 16#00#, 16#1F#, 16#E0#, 16#00#, 16#7F#, 16#80#, 16#01#, 16#FE#, 16#00#, 16#07#, 16#F0#, 16#00#, 16#1F#, 16#C0#, 16#00#, 16#7F#, 16#00#, 16#03#, 16#FC#, 16#00#, 16#0F#, 16#F0#, 16#00#, 16#3F#, 16#C0#, 16#00#, 16#FF#, 16#00#, 16#03#, 16#F8#, 16#00#, 16#0F#, 16#E0#, 16#00#, 16#3F#, 16#80#, 16#00#, 16#FE#, 16#00#, 16#03#, 16#F8#, 16#00#, 16#1F#, 16#E0#, 16#00#, 16#3F#, 16#80#, 16#01#, 16#FC#, 16#00#, 16#03#, 16#F8#, 16#00#, 16#3F#, 16#C0#, 16#00#, 16#3F#, 16#00#, 16#03#, 16#F8#, 16#00#, 16#03#, 16#F0#, 16#00#, 16#7F#, 16#00#, 16#00#, 16#3F#, 16#00#, 16#07#, 16#F0#, 16#00#, 16#03#, 16#F0#, 16#00#, 16#FE#, 16#00#, 16#00#, 16#1F#, 16#00#, 16#0F#, 16#C0#, 16#00#, 16#01#, 16#F8#, 16#01#, 16#F8#, 16#00#, 16#00#, 16#0F#, 16#80#, 16#3F#, 16#00#, 16#00#, 16#00#, 16#7C#, 16#07#, 16#C0#, 16#00#, 16#00#, 16#03#, 16#F3#, 16#F8#, 16#00#, 16#00#, 16#00#, 16#0F#, 16#FC#, 16#00#, 16#00#, 16#00#, 16#00#, 16#30#, 16#00#, 16#00#, 16#00#, 16#00#, 16#0E#, 16#00#, 16#00#, 16#00#, 16#00#, 16#01#, 16#C0#, 16#00#, 16#06#, 16#00#, 16#00#, 16#3F#, 16#F0#, 16#00#, 16#C0#, 16#00#, 16#07#, 16#FF#, 16#F0#, 16#38#, 16#00#, 16#00#, 16#FF#, 16#FF#, 16#FF#, 16#00#, 16#00#, 16#3F#, 16#FF#, 16#FF#, 16#E0#, 16#00#, 16#03#, 16#01#, 16#FF#, 16#F8#, 16#00#, 16#00#, 16#00#, 16#01#, 16#FE#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#01#, 16#FF#, 16#FF#, 16#80#, 16#00#, 16#00#, 16#07#, 16#FF#, 16#FE#, 16#00#, 16#00#, 16#00#, 16#3F#, 16#83#, 16#F8#, 16#00#, 16#00#, 16#03#, 16#F8#, 16#1F#, 16#C0#, 16#00#, 16#00#, 16#3F#, 16#81#, 16#FC#, 16#00#, 16#00#, 16#07#, 16#F0#, 16#1F#, 16#E0#, 16#00#, 16#00#, 16#7F#, 16#00#, 16#FE#, 16#00#, 16#00#, 16#07#, 16#F0#, 16#1F#, 16#E0#, 16#00#, 16#00#, 16#7F#, 16#01#, 16#FC#, 16#00#, 16#00#, 16#0F#, 16#E0#, 16#1F#, 16#C0#, 16#00#, 16#00#, 16#FE#, 16#03#, 16#FC#, 16#00#, 16#00#, 16#0F#, 16#E0#, 16#3F#, 16#80#, 16#00#, 16#00#, 16#FE#, 16#07#, 16#F0#, 16#00#, 16#00#, 16#1F#, 16#C1#, 16#FE#, 16#00#, 16#00#, 16#01#, 16#FF#, 16#FF#, 16#00#, 16#00#, 16#00#, 16#1F#, 16#FF#, 16#C0#, 16#00#, 16#00#, 16#03#, 16#FD#, 16#FC#, 16#00#, 16#00#, 16#00#, 16#3F#, 16#8F#, 16#C0#, 16#00#, 16#00#, 16#03#, 16#F8#, 16#FE#, 16#00#, 16#00#, 16#00#, 16#3F#, 16#8F#, 16#E0#, 16#00#, 16#00#, 16#07#, 16#F0#, 16#7E#, 16#00#, 16#00#, 16#00#, 16#7F#, 16#07#, 16#F0#, 16#00#, 16#00#, 16#07#, 16#F0#, 16#7F#, 16#00#, 16#00#, 16#00#, 16#7F#, 16#03#, 16#F0#, 16#00#, 16#00#, 16#0F#, 16#E0#, 16#3F#, 16#80#, 16#00#, 16#00#, 16#FE#, 16#03#, 16#F8#, 16#00#, 16#00#, 16#0F#, 16#E0#, 16#1F#, 16#80#, 16#00#, 16#01#, 16#FE#, 16#01#, 16#FC#, 16#00#, 16#00#, 16#1F#, 16#E0#, 16#1F#, 16#C0#, 16#00#, 16#03#, 16#FE#, 16#00#, 16#FE#, 16#00#, 16#00#, 16#FF#, 16#FC#, 16#0F#, 16#FC#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#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#18#, 16#00#, 16#00#, 16#00#, 16#7F#, 16#F3#, 16#00#, 16#00#, 16#00#, 16#0F#, 16#83#, 16#F0#, 16#00#, 16#00#, 16#01#, 16#F0#, 16#1F#, 16#00#, 16#00#, 16#00#, 16#3E#, 16#00#, 16#F0#, 16#00#, 16#00#, 16#07#, 16#E0#, 16#07#, 16#00#, 16#00#, 16#00#, 16#7C#, 16#00#, 16#60#, 16#00#, 16#00#, 16#07#, 16#C0#, 16#06#, 16#00#, 16#00#, 16#00#, 16#7E#, 16#00#, 16#60#, 16#00#, 16#00#, 16#07#, 16#E0#, 16#06#, 16#00#, 16#00#, 16#00#, 16#7F#, 16#00#, 16#00#, 16#00#, 16#00#, 16#07#, 16#F8#, 16#00#, 16#00#, 16#00#, 16#00#, 16#7F#, 16#E0#, 16#00#, 16#00#, 16#00#, 16#03#, 16#FF#, 16#00#, 16#00#, 16#00#, 16#00#, 16#1F#, 16#F8#, 16#00#, 16#00#, 16#00#, 16#00#, 16#FF#, 16#C0#, 16#00#, 16#00#, 16#00#, 16#07#, 16#FE#, 16#00#, 16#00#, 16#00#, 16#00#, 16#3F#, 16#F0#, 16#00#, 16#00#, 16#00#, 16#01#, 16#FF#, 16#80#, 16#00#, 16#00#, 16#00#, 16#0F#, 16#F8#, 16#00#, 16#00#, 16#00#, 16#00#, 16#3F#, 16#80#, 16#00#, 16#00#, 16#00#, 16#01#, 16#FC#, 16#00#, 16#00#, 16#00#, 16#00#, 16#1F#, 16#C0#, 16#00#, 16#00#, 16#20#, 16#00#, 16#FC#, 16#00#, 16#00#, 16#06#, 16#00#, 16#0F#, 16#C0#, 16#00#, 16#00#, 16#60#, 16#00#, 16#FC#, 16#00#, 16#00#, 16#07#, 16#00#, 16#0F#, 16#80#, 16#00#, 16#00#, 16#70#, 16#00#, 16#F8#, 16#00#, 16#00#, 16#07#, 16#80#, 16#1F#, 16#80#, 16#00#, 16#00#, 16#7C#, 16#03#, 16#F0#, 16#00#, 16#00#, 16#0F#, 16#E0#, 16#7E#, 16#00#, 16#00#, 16#00#, 16#C7#, 16#FF#, 16#80#, 16#00#, 16#00#, 16#0C#, 16#0F#, 16#E0#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#03#, 16#FF#, 16#FF#, 16#FF#, 16#00#, 16#00#, 16#3F#, 16#FF#, 16#FF#, 16#F0#, 16#00#, 16#03#, 16#F8#, 16#FE#, 16#3F#, 16#00#, 16#00#, 16#3C#, 16#0F#, 16#E0#, 16#F0#, 16#00#, 16#07#, 16#81#, 16#FC#, 16#0F#, 16#00#, 16#00#, 16#70#, 16#1F#, 16#C0#, 16#60#, 16#00#, 16#06#, 16#01#, 16#FC#, 16#06#, 16#00#, 16#00#, 16#60#, 16#1F#, 16#80#, 16#60#, 16#00#, 16#00#, 16#03#, 16#F8#, 16#06#, 16#00#, 16#00#, 16#00#, 16#3F#, 16#80#, 16#00#, 16#00#, 16#00#, 16#03#, 16#F8#, 16#00#, 16#00#, 16#00#, 16#00#, 16#7F#, 16#00#, 16#00#, 16#00#, 16#00#, 16#07#, 16#F0#, 16#00#, 16#00#, 16#00#, 16#00#, 16#7F#, 16#00#, 16#00#, 16#00#, 16#00#, 16#07#, 16#E0#, 16#00#, 16#00#, 16#00#, 16#00#, 16#FE#, 16#00#, 16#00#, 16#00#, 16#00#, 16#0F#, 16#E0#, 16#00#, 16#00#, 16#00#, 16#00#, 16#FE#, 16#00#, 16#00#, 16#00#, 16#00#, 16#1F#, 16#C0#, 16#00#, 16#00#, 16#00#, 16#01#, 16#FC#, 16#00#, 16#00#, 16#00#, 16#00#, 16#1F#, 16#C0#, 16#00#, 16#00#, 16#00#, 16#01#, 16#F8#, 16#00#, 16#00#, 16#00#, 16#00#, 16#3F#, 16#80#, 16#00#, 16#00#, 16#00#, 16#03#, 16#F8#, 16#00#, 16#00#, 16#00#, 16#00#, 16#3F#, 16#80#, 16#00#, 16#00#, 16#00#, 16#07#, 16#F0#, 16#00#, 16#00#, 16#00#, 16#00#, 16#7F#, 16#00#, 16#00#, 16#00#, 16#00#, 16#07#, 16#F0#, 16#00#, 16#00#, 16#00#, 16#00#, 16#FF#, 16#00#, 16#00#, 16#00#, 16#00#, 16#1F#, 16#F0#, 16#00#, 16#00#, 16#00#, 16#0F#, 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#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#F8#, 16#1F#, 16#F8#, 16#00#, 16#07#, 16#FE#, 16#00#, 16#7E#, 16#00#, 16#00#, 16#3F#, 16#80#, 16#01#, 16#C0#, 16#00#, 16#03#, 16#F8#, 16#00#, 16#1C#, 16#00#, 16#00#, 16#3F#, 16#80#, 16#01#, 16#80#, 16#00#, 16#07#, 16#F0#, 16#00#, 16#18#, 16#00#, 16#00#, 16#7F#, 16#00#, 16#03#, 16#00#, 16#00#, 16#07#, 16#F0#, 16#00#, 16#30#, 16#00#, 16#00#, 16#7E#, 16#00#, 16#03#, 16#00#, 16#00#, 16#0F#, 16#E0#, 16#00#, 16#70#, 16#00#, 16#00#, 16#FE#, 16#00#, 16#06#, 16#00#, 16#00#, 16#0F#, 16#E0#, 16#00#, 16#60#, 16#00#, 16#01#, 16#FC#, 16#00#, 16#06#, 16#00#, 16#00#, 16#1F#, 16#C0#, 16#00#, 16#C0#, 16#00#, 16#01#, 16#FC#, 16#00#, 16#0C#, 16#00#, 16#00#, 16#1F#, 16#C0#, 16#00#, 16#C0#, 16#00#, 16#03#, 16#F8#, 16#00#, 16#0C#, 16#00#, 16#00#, 16#3F#, 16#80#, 16#01#, 16#80#, 16#00#, 16#03#, 16#F8#, 16#00#, 16#18#, 16#00#, 16#00#, 16#3F#, 16#80#, 16#01#, 16#80#, 16#00#, 16#03#, 16#F0#, 16#00#, 16#30#, 16#00#, 16#00#, 16#7F#, 16#00#, 16#03#, 16#00#, 16#00#, 16#07#, 16#F0#, 16#00#, 16#30#, 16#00#, 16#00#, 16#7F#, 16#00#, 16#07#, 16#00#, 16#00#, 16#07#, 16#F0#, 16#00#, 16#60#, 16#00#, 16#00#, 16#7F#, 16#00#, 16#0E#, 16#00#, 16#00#, 16#07#, 16#F0#, 16#00#, 16#C0#, 16#00#, 16#00#, 16#3F#, 16#00#, 16#1C#, 16#00#, 16#00#, 16#03#, 16#F8#, 16#03#, 16#80#, 16#00#, 16#00#, 16#1F#, 16#C0#, 16#F0#, 16#00#, 16#00#, 16#00#, 16#7F#, 16#FC#, 16#00#, 16#00#, 16#00#, 16#01#, 16#FF#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#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#F0#, 16#0F#, 16#F8#, 16#00#, 16#0F#, 16#F8#, 16#00#, 16#3E#, 16#00#, 16#00#, 16#7F#, 16#00#, 16#01#, 16#C0#, 16#00#, 16#07#, 16#F0#, 16#00#, 16#38#, 16#00#, 16#00#, 16#3F#, 16#80#, 16#03#, 16#80#, 16#00#, 16#03#, 16#F8#, 16#00#, 16#30#, 16#00#, 16#00#, 16#3F#, 16#80#, 16#07#, 16#00#, 16#00#, 16#03#, 16#F8#, 16#00#, 16#E0#, 16#00#, 16#00#, 16#3F#, 16#80#, 16#0C#, 16#00#, 16#00#, 16#03#, 16#F8#, 16#01#, 16#C0#, 16#00#, 16#00#, 16#1F#, 16#80#, 16#38#, 16#00#, 16#00#, 16#01#, 16#F8#, 16#03#, 16#00#, 16#00#, 16#00#, 16#1F#, 16#C0#, 16#70#, 16#00#, 16#00#, 16#01#, 16#FC#, 16#06#, 16#00#, 16#00#, 16#00#, 16#1F#, 16#C0#, 16#C0#, 16#00#, 16#00#, 16#01#, 16#FC#, 16#1C#, 16#00#, 16#00#, 16#00#, 16#0F#, 16#C1#, 16#80#, 16#00#, 16#00#, 16#00#, 16#FC#, 16#38#, 16#00#, 16#00#, 16#00#, 16#0F#, 16#C7#, 16#00#, 16#00#, 16#00#, 16#00#, 16#FE#, 16#60#, 16#00#, 16#00#, 16#00#, 16#0F#, 16#EE#, 16#00#, 16#00#, 16#00#, 16#00#, 16#FF#, 16#C0#, 16#00#, 16#00#, 16#00#, 16#0F#, 16#F8#, 16#00#, 16#00#, 16#00#, 16#00#, 16#7F#, 16#80#, 16#00#, 16#00#, 16#00#, 16#07#, 16#F0#, 16#00#, 16#00#, 16#00#, 16#00#, 16#7E#, 16#00#, 16#00#, 16#00#, 16#00#, 16#07#, 16#E0#, 16#00#, 16#00#, 16#00#, 16#00#, 16#7C#, 16#00#, 16#00#, 16#00#, 16#00#, 16#07#, 16#C0#, 16#00#, 16#00#, 16#00#, 16#00#, 16#78#, 16#00#, 16#00#, 16#00#, 16#00#, 16#03#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#30#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#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#E3#, 16#FF#, 16#C3#, 16#F0#, 16#0F#, 16#F8#, 16#0F#, 16#F0#, 16#07#, 16#00#, 16#7F#, 16#00#, 16#7F#, 16#00#, 16#70#, 16#07#, 16#F0#, 16#07#, 16#E0#, 16#07#, 16#00#, 16#3F#, 16#00#, 16#7E#, 16#00#, 16#60#, 16#03#, 16#F0#, 16#07#, 16#F0#, 16#0E#, 16#00#, 16#3F#, 16#80#, 16#7F#, 16#00#, 16#C0#, 16#03#, 16#F8#, 16#0F#, 16#F0#, 16#0C#, 16#00#, 16#3F#, 16#80#, 16#FF#, 16#01#, 16#80#, 16#03#, 16#F8#, 16#1B#, 16#F0#, 16#18#, 16#00#, 16#3F#, 16#81#, 16#BF#, 16#03#, 16#00#, 16#01#, 16#F8#, 16#33#, 16#F0#, 16#30#, 16#00#, 16#1F#, 16#83#, 16#3F#, 16#06#, 16#00#, 16#01#, 16#F8#, 16#63#, 16#F8#, 16#60#, 16#00#, 16#1F#, 16#86#, 16#3F#, 16#8C#, 16#00#, 16#01#, 16#FC#, 16#C3#, 16#F8#, 16#C0#, 16#00#, 16#1F#, 16#CC#, 16#1F#, 16#98#, 16#00#, 16#01#, 16#FD#, 16#C1#, 16#F9#, 16#80#, 16#00#, 16#1F#, 16#D8#, 16#1F#, 16#B0#, 16#00#, 16#00#, 16#FF#, 16#81#, 16#FB#, 16#00#, 16#00#, 16#0F#, 16#F0#, 16#1F#, 16#E0#, 16#00#, 16#00#, 16#FF#, 16#01#, 16#FE#, 16#00#, 16#00#, 16#0F#, 16#E0#, 16#1F#, 16#C0#, 16#00#, 16#00#, 16#FE#, 16#01#, 16#FC#, 16#00#, 16#00#, 16#0F#, 16#C0#, 16#1F#, 16#80#, 16#00#, 16#00#, 16#FC#, 16#00#, 16#F8#, 16#00#, 16#00#, 16#07#, 16#80#, 16#0F#, 16#00#, 16#00#, 16#00#, 16#78#, 16#00#, 16#F0#, 16#00#, 16#00#, 16#07#, 16#00#, 16#0E#, 16#00#, 16#00#, 16#00#, 16#70#, 16#00#, 16#E0#, 16#00#, 16#00#, 16#06#, 16#00#, 16#0C#, 16#00#, 16#00#, 16#00#, 16#60#, 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#03#, 16#FF#, 16#F0#, 16#FF#, 16#C0#, 16#00#, 16#0F#, 16#F8#, 16#03#, 16#F0#, 16#00#, 16#00#, 16#3F#, 16#80#, 16#1E#, 16#00#, 16#00#, 16#03#, 16#F8#, 16#03#, 16#80#, 16#00#, 16#00#, 16#3F#, 16#80#, 16#70#, 16#00#, 16#00#, 16#01#, 16#F8#, 16#06#, 16#00#, 16#00#, 16#00#, 16#1F#, 16#C0#, 16#C0#, 16#00#, 16#00#, 16#01#, 16#FC#, 16#18#, 16#00#, 16#00#, 16#00#, 16#0F#, 16#C3#, 16#00#, 16#00#, 16#00#, 16#00#, 16#FE#, 16#60#, 16#00#, 16#00#, 16#00#, 16#0F#, 16#EC#, 16#00#, 16#00#, 16#00#, 16#00#, 16#7F#, 16#80#, 16#00#, 16#00#, 16#00#, 16#07#, 16#F0#, 16#00#, 16#00#, 16#00#, 16#00#, 16#7F#, 16#00#, 16#00#, 16#00#, 16#00#, 16#07#, 16#F0#, 16#00#, 16#00#, 16#00#, 16#00#, 16#3F#, 16#00#, 16#00#, 16#00#, 16#00#, 16#03#, 16#F8#, 16#00#, 16#00#, 16#00#, 16#00#, 16#7F#, 16#80#, 16#00#, 16#00#, 16#00#, 16#0F#, 16#F8#, 16#00#, 16#00#, 16#00#, 16#01#, 16#DF#, 16#C0#, 16#00#, 16#00#, 16#00#, 16#39#, 16#FC#, 16#00#, 16#00#, 16#00#, 16#07#, 16#0F#, 16#C0#, 16#00#, 16#00#, 16#00#, 16#60#, 16#FE#, 16#00#, 16#00#, 16#00#, 16#0C#, 16#0F#, 16#E0#, 16#00#, 16#00#, 16#01#, 16#80#, 16#7E#, 16#00#, 16#00#, 16#00#, 16#38#, 16#07#, 16#F0#, 16#00#, 16#00#, 16#07#, 16#00#, 16#7F#, 16#00#, 16#00#, 16#00#, 16#E0#, 16#07#, 16#F0#, 16#00#, 16#00#, 16#1E#, 16#00#, 16#7F#, 16#80#, 16#00#, 16#07#, 16#F0#, 16#0F#, 16#FC#, 16#00#, 16#00#, 16#FF#, 16#C3#, 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#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#03#, 16#FF#, 16#E0#, 16#FF#, 16#C0#, 16#00#, 16#0F#, 16#F8#, 16#03#, 16#F0#, 16#00#, 16#00#, 16#7F#, 16#00#, 16#1E#, 16#00#, 16#00#, 16#07#, 16#F0#, 16#01#, 16#C0#, 16#00#, 16#00#, 16#3F#, 16#00#, 16#18#, 16#00#, 16#00#, 16#03#, 16#F8#, 16#03#, 16#00#, 16#00#, 16#00#, 16#3F#, 16#80#, 16#70#, 16#00#, 16#00#, 16#01#, 16#F8#, 16#06#, 16#00#, 16#00#, 16#00#, 16#1F#, 16#C0#, 16#C0#, 16#00#, 16#00#, 16#01#, 16#FC#, 16#18#, 16#00#, 16#00#, 16#00#, 16#0F#, 16#C3#, 16#80#, 16#00#, 16#00#, 16#00#, 16#FE#, 16#30#, 16#00#, 16#00#, 16#00#, 16#0F#, 16#E6#, 16#00#, 16#00#, 16#00#, 16#00#, 16#7E#, 16#E0#, 16#00#, 16#00#, 16#00#, 16#07#, 16#FC#, 16#00#, 16#00#, 16#00#, 16#00#, 16#7F#, 16#80#, 16#00#, 16#00#, 16#00#, 16#03#, 16#F0#, 16#00#, 16#00#, 16#00#, 16#00#, 16#7F#, 16#00#, 16#00#, 16#00#, 16#00#, 16#07#, 16#F0#, 16#00#, 16#00#, 16#00#, 16#00#, 16#7F#, 16#00#, 16#00#, 16#00#, 16#00#, 16#0F#, 16#E0#, 16#00#, 16#00#, 16#00#, 16#00#, 16#FE#, 16#00#, 16#00#, 16#00#, 16#00#, 16#0F#, 16#E0#, 16#00#, 16#00#, 16#00#, 16#00#, 16#FC#, 16#00#, 16#00#, 16#00#, 16#00#, 16#1F#, 16#C0#, 16#00#, 16#00#, 16#00#, 16#01#, 16#FC#, 16#00#, 16#00#, 16#00#, 16#00#, 16#1F#, 16#C0#, 16#00#, 16#00#, 16#00#, 16#03#, 16#FC#, 16#00#, 16#00#, 16#00#, 16#00#, 16#3F#, 16#C0#, 16#00#, 16#00#, 16#00#, 16#07#, 16#FC#, 16#00#, 16#00#, 16#00#, 16#03#, 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#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#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#00#, 16#00#, 16#3F#, 16#FF#, 16#FF#, 16#00#, 16#00#, 16#07#, 16#F8#, 16#0F#, 16#F0#, 16#00#, 16#00#, 16#7C#, 16#01#, 16#FE#, 16#00#, 16#00#, 16#07#, 16#80#, 16#1F#, 16#C0#, 16#00#, 16#00#, 16#F0#, 16#03#, 16#F8#, 16#00#, 16#00#, 16#0E#, 16#00#, 16#7F#, 16#80#, 16#00#, 16#00#, 16#C0#, 16#0F#, 16#F0#, 16#00#, 16#00#, 16#08#, 16#00#, 16#FE#, 16#00#, 16#00#, 16#00#, 16#00#, 16#1F#, 16#C0#, 16#00#, 16#00#, 16#00#, 16#03#, 16#FC#, 16#00#, 16#00#, 16#00#, 16#00#, 16#7F#, 16#80#, 16#00#, 16#00#, 16#00#, 16#07#, 16#F0#, 16#00#, 16#00#, 16#00#, 16#00#, 16#FE#, 16#00#, 16#00#, 16#00#, 16#00#, 16#1F#, 16#E0#, 16#00#, 16#00#, 16#00#, 16#03#, 16#FC#, 16#00#, 16#00#, 16#00#, 16#00#, 16#3F#, 16#80#, 16#00#, 16#00#, 16#00#, 16#07#, 16#F0#, 16#00#, 16#00#, 16#00#, 16#00#, 16#FF#, 16#00#, 16#00#, 16#00#, 16#00#, 16#1F#, 16#E0#, 16#00#, 16#00#, 16#00#, 16#01#, 16#FC#, 16#00#, 16#00#, 16#00#, 16#00#, 16#3F#, 16#80#, 16#00#, 16#00#, 16#00#, 16#07#, 16#F8#, 16#00#, 16#40#, 16#00#, 16#00#, 16#FF#, 16#00#, 16#0C#, 16#00#, 16#00#, 16#0F#, 16#E0#, 16#01#, 16#C0#, 16#00#, 16#01#, 16#FC#, 16#00#, 16#38#, 16#00#, 16#00#, 16#3F#, 16#C0#, 16#07#, 16#80#, 16#00#, 16#07#, 16#F8#, 16#01#, 16#F8#, 16#00#, 16#00#, 16#7F#, 16#00#, 16#FF#, 16#80#, 16#00#, 16#0F#, 16#FF#, 16#FF#, 16#F0#, 16#00#, 16#00#, 16#FF#, 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#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#01#, 16#FF#, 16#80#, 16#00#, 16#00#, 16#00#, 16#1F#, 16#F8#, 16#00#, 16#00#, 16#00#, 16#01#, 16#F0#, 16#00#, 16#00#, 16#00#, 16#00#, 16#1E#, 16#00#, 16#00#, 16#00#, 16#00#, 16#03#, 16#E0#, 16#00#, 16#00#, 16#00#, 16#00#, 16#3E#, 16#00#, 16#00#, 16#00#, 16#00#, 16#03#, 16#E0#, 16#00#, 16#00#, 16#00#, 16#00#, 16#3C#, 16#00#, 16#00#, 16#00#, 16#00#, 16#03#, 16#C0#, 16#00#, 16#00#, 16#00#, 16#00#, 16#7C#, 16#00#, 16#00#, 16#00#, 16#00#, 16#07#, 16#C0#, 16#00#, 16#00#, 16#00#, 16#00#, 16#78#, 16#00#, 16#00#, 16#00#, 16#00#, 16#07#, 16#80#, 16#00#, 16#00#, 16#00#, 16#00#, 16#F8#, 16#00#, 16#00#, 16#00#, 16#00#, 16#0F#, 16#80#, 16#00#, 16#00#, 16#00#, 16#00#, 16#F0#, 16#00#, 16#00#, 16#00#, 16#00#, 16#0F#, 16#00#, 16#00#, 16#00#, 16#00#, 16#01#, 16#F0#, 16#00#, 16#00#, 16#00#, 16#00#, 16#1F#, 16#00#, 16#00#, 16#00#, 16#00#, 16#01#, 16#E0#, 16#00#, 16#00#, 16#00#, 16#00#, 16#1E#, 16#00#, 16#00#, 16#00#, 16#00#, 16#03#, 16#E0#, 16#00#, 16#00#, 16#00#, 16#00#, 16#3E#, 16#00#, 16#00#, 16#00#, 16#00#, 16#03#, 16#C0#, 16#00#, 16#00#, 16#00#, 16#00#, 16#3C#, 16#00#, 16#00#, 16#00#, 16#00#, 16#07#, 16#C0#, 16#00#, 16#00#, 16#00#, 16#00#, 16#7C#, 16#00#, 16#00#, 16#00#, 16#00#, 16#07#, 16#80#, 16#00#, 16#00#, 16#00#, 16#00#, 16#78#, 16#00#, 16#00#, 16#00#, 16#00#, 16#0F#, 16#80#, 16#00#, 16#00#, 16#00#, 16#00#, 16#F8#, 16#00#, 16#00#, 16#00#, 16#00#, 16#0F#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#F0#, 16#00#, 16#00#, 16#00#, 16#00#, 16#0F#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#F0#, 16#00#, 16#00#, 16#00#, 16#00#, 16#0F#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#FF#, 16#80#, 16#00#, 16#00#, 16#00#, 16#0F#, 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#3C#, 16#00#, 16#00#, 16#00#, 16#00#, 16#03#, 16#C0#, 16#00#, 16#00#, 16#00#, 16#00#, 16#3C#, 16#00#, 16#00#, 16#00#, 16#00#, 16#03#, 16#C0#, 16#00#, 16#00#, 16#00#, 16#00#, 16#1E#, 16#00#, 16#00#, 16#00#, 16#00#, 16#01#, 16#E0#, 16#00#, 16#00#, 16#00#, 16#00#, 16#1E#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#F0#, 16#00#, 16#00#, 16#00#, 16#00#, 16#0F#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#F0#, 16#00#, 16#00#, 16#00#, 16#00#, 16#0F#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#78#, 16#00#, 16#00#, 16#00#, 16#00#, 16#07#, 16#80#, 16#00#, 16#00#, 16#00#, 16#00#, 16#78#, 16#00#, 16#00#, 16#00#, 16#00#, 16#03#, 16#C0#, 16#00#, 16#00#, 16#00#, 16#00#, 16#3C#, 16#00#, 16#00#, 16#00#, 16#00#, 16#03#, 16#C0#, 16#00#, 16#00#, 16#00#, 16#00#, 16#3C#, 16#00#, 16#00#, 16#00#, 16#00#, 16#01#, 16#E0#, 16#00#, 16#00#, 16#00#, 16#00#, 16#1E#, 16#00#, 16#00#, 16#00#, 16#00#, 16#01#, 16#E0#, 16#00#, 16#00#, 16#00#, 16#00#, 16#0E#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#F0#, 16#00#, 16#00#, 16#00#, 16#00#, 16#0F#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#F0#, 16#00#, 16#00#, 16#00#, 16#00#, 16#07#, 16#80#, 16#00#, 16#00#, 16#00#, 16#00#, 16#78#, 16#00#, 16#00#, 16#00#, 16#00#, 16#07#, 16#80#, 16#00#, 16#00#, 16#00#, 16#00#, 16#78#, 16#00#, 16#00#, 16#00#, 16#00#, 16#03#, 16#C0#, 16#00#, 16#00#, 16#00#, 16#00#, 16#3C#, 16#00#, 16#00#, 16#00#, 16#00#, 16#03#, 16#C0#, 16#00#, 16#00#, 16#00#, 16#00#, 16#1E#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#03#, 16#FF#, 16#00#, 16#00#, 16#00#, 16#00#, 16#3F#, 16#F0#, 16#00#, 16#00#, 16#00#, 16#00#, 16#1F#, 16#00#, 16#00#, 16#00#, 16#00#, 16#01#, 16#E0#, 16#00#, 16#00#, 16#00#, 16#00#, 16#3E#, 16#00#, 16#00#, 16#00#, 16#00#, 16#03#, 16#E0#, 16#00#, 16#00#, 16#00#, 16#00#, 16#3E#, 16#00#, 16#00#, 16#00#, 16#00#, 16#03#, 16#C0#, 16#00#, 16#00#, 16#00#, 16#00#, 16#7C#, 16#00#, 16#00#, 16#00#, 16#00#, 16#07#, 16#C0#, 16#00#, 16#00#, 16#00#, 16#00#, 16#7C#, 16#00#, 16#00#, 16#00#, 16#00#, 16#07#, 16#80#, 16#00#, 16#00#, 16#00#, 16#00#, 16#F8#, 16#00#, 16#00#, 16#00#, 16#00#, 16#0F#, 16#80#, 16#00#, 16#00#, 16#00#, 16#00#, 16#F8#, 16#00#, 16#00#, 16#00#, 16#00#, 16#0F#, 16#00#, 16#00#, 16#00#, 16#00#, 16#01#, 16#F0#, 16#00#, 16#00#, 16#00#, 16#00#, 16#1F#, 16#00#, 16#00#, 16#00#, 16#00#, 16#01#, 16#F0#, 16#00#, 16#00#, 16#00#, 16#00#, 16#1E#, 16#00#, 16#00#, 16#00#, 16#00#, 16#03#, 16#E0#, 16#00#, 16#00#, 16#00#, 16#00#, 16#3E#, 16#00#, 16#00#, 16#00#, 16#00#, 16#03#, 16#E0#, 16#00#, 16#00#, 16#00#, 16#00#, 16#3C#, 16#00#, 16#00#, 16#00#, 16#00#, 16#07#, 16#C0#, 16#00#, 16#00#, 16#00#, 16#00#, 16#7C#, 16#00#, 16#00#, 16#00#, 16#00#, 16#07#, 16#C0#, 16#00#, 16#00#, 16#00#, 16#00#, 16#78#, 16#00#, 16#00#, 16#00#, 16#00#, 16#0F#, 16#80#, 16#00#, 16#00#, 16#00#, 16#00#, 16#F8#, 16#00#, 16#00#, 16#00#, 16#00#, 16#0F#, 16#80#, 16#00#, 16#00#, 16#00#, 16#00#, 16#F0#, 16#00#, 16#00#, 16#00#, 16#00#, 16#0F#, 16#00#, 16#00#, 16#00#, 16#00#, 16#01#, 16#F0#, 16#00#, 16#00#, 16#00#, 16#00#, 16#1F#, 16#00#, 16#00#, 16#00#, 16#00#, 16#01#, 16#E0#, 16#00#, 16#00#, 16#00#, 16#00#, 16#FE#, 16#00#, 16#00#, 16#00#, 16#00#, 16#0F#, 16#E0#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#1F#, 16#00#, 16#00#, 16#00#, 16#00#, 16#01#, 16#F0#, 16#00#, 16#00#, 16#00#, 16#00#, 16#3F#, 16#80#, 16#00#, 16#00#, 16#00#, 16#03#, 16#F8#, 16#00#, 16#00#, 16#00#, 16#00#, 16#7F#, 16#80#, 16#00#, 16#00#, 16#00#, 16#07#, 16#BC#, 16#00#, 16#00#, 16#00#, 16#00#, 16#F3#, 16#C0#, 16#00#, 16#00#, 16#00#, 16#0F#, 16#1E#, 16#00#, 16#00#, 16#00#, 16#01#, 16#E1#, 16#E0#, 16#00#, 16#00#, 16#00#, 16#1E#, 16#0F#, 16#00#, 16#00#, 16#00#, 16#03#, 16#E0#, 16#F0#, 16#00#, 16#00#, 16#00#, 16#3C#, 16#07#, 16#80#, 16#00#, 16#00#, 16#07#, 16#C0#, 16#78#, 16#00#, 16#00#, 16#00#, 16#78#, 16#03#, 16#C0#, 16#00#, 16#00#, 16#0F#, 16#80#, 16#3C#, 16#00#, 16#00#, 16#00#, 16#F0#, 16#01#, 16#E0#, 16#00#, 16#00#, 16#1F#, 16#00#, 16#1E#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#0F#, 16#FF#, 16#FF#, 16#F0#, 16#00#, 16#00#, 16#FF#, 16#FF#, 16#FF#, 16#00#, 16#00#, 16#0F#, 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#07#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#F8#, 16#00#, 16#00#, 16#00#, 16#00#, 16#0F#, 16#80#, 16#00#, 16#00#, 16#00#, 16#00#, 16#FC#, 16#00#, 16#00#, 16#00#, 16#00#, 16#07#, 16#E0#, 16#00#, 16#00#, 16#00#, 16#00#, 16#1E#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#F0#, 16#00#, 16#00#, 16#00#, 16#00#, 16#03#, 16#80#, 16#00#, 16#00#, 16#00#, 16#00#, 16#1C#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#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#60#, 16#00#, 16#00#, 16#00#, 16#7F#, 16#3E#, 16#00#, 16#00#, 16#00#, 16#0F#, 16#9F#, 16#C0#, 16#00#, 16#00#, 16#01#, 16#F0#, 16#FC#, 16#00#, 16#00#, 16#00#, 16#3E#, 16#0F#, 16#C0#, 16#00#, 16#00#, 16#07#, 16#C0#, 16#FC#, 16#00#, 16#00#, 16#00#, 16#FC#, 16#0F#, 16#80#, 16#00#, 16#00#, 16#0F#, 16#80#, 16#F8#, 16#00#, 16#00#, 16#01#, 16#F8#, 16#1F#, 16#80#, 16#00#, 16#00#, 16#1F#, 16#01#, 16#F0#, 16#00#, 16#00#, 16#03#, 16#F0#, 16#1F#, 16#00#, 16#00#, 16#00#, 16#3F#, 16#03#, 16#F0#, 16#00#, 16#00#, 16#07#, 16#E0#, 16#3E#, 16#00#, 16#00#, 16#00#, 16#7E#, 16#03#, 16#E0#, 16#00#, 16#00#, 16#07#, 16#E0#, 16#7E#, 16#00#, 16#00#, 16#00#, 16#7E#, 16#07#, 16#E0#, 16#00#, 16#00#, 16#07#, 16#C0#, 16#FE#, 16#00#, 16#00#, 16#00#, 16#7C#, 16#0F#, 16#C6#, 16#00#, 16#00#, 16#07#, 16#E1#, 16#7C#, 16#40#, 16#00#, 16#00#, 16#7E#, 16#27#, 16#C8#, 16#00#, 16#00#, 16#07#, 16#FE#, 16#7F#, 16#80#, 16#00#, 16#00#, 16#3F#, 16#C7#, 16#E0#, 16#00#, 16#00#, 16#01#, 16#F0#, 16#3C#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#07#, 16#E0#, 16#00#, 16#00#, 16#00#, 16#07#, 16#FE#, 16#00#, 16#00#, 16#00#, 16#00#, 16#0F#, 16#C0#, 16#00#, 16#00#, 16#00#, 16#00#, 16#FC#, 16#00#, 16#00#, 16#00#, 16#00#, 16#0F#, 16#C0#, 16#00#, 16#00#, 16#00#, 16#00#, 16#FC#, 16#00#, 16#00#, 16#00#, 16#00#, 16#0F#, 16#80#, 16#00#, 16#00#, 16#00#, 16#01#, 16#F8#, 16#00#, 16#00#, 16#00#, 16#00#, 16#1F#, 16#80#, 16#00#, 16#00#, 16#00#, 16#01#, 16#F0#, 16#00#, 16#00#, 16#00#, 16#00#, 16#1F#, 16#1F#, 16#00#, 16#00#, 16#00#, 16#03#, 16#F3#, 16#F8#, 16#00#, 16#00#, 16#00#, 16#3F#, 16#7F#, 16#C0#, 16#00#, 16#00#, 16#03#, 16#E8#, 16#FC#, 16#00#, 16#00#, 16#00#, 16#7F#, 16#07#, 16#E0#, 16#00#, 16#00#, 16#07#, 16#F0#, 16#7E#, 16#00#, 16#00#, 16#00#, 16#7E#, 16#07#, 16#E0#, 16#00#, 16#00#, 16#07#, 16#E0#, 16#7E#, 16#00#, 16#00#, 16#00#, 16#FC#, 16#07#, 16#C0#, 16#00#, 16#00#, 16#0F#, 16#C0#, 16#FC#, 16#00#, 16#00#, 16#00#, 16#F8#, 16#0F#, 16#C0#, 16#00#, 16#00#, 16#1F#, 16#80#, 16#FC#, 16#00#, 16#00#, 16#01#, 16#F8#, 16#0F#, 16#80#, 16#00#, 16#00#, 16#1F#, 16#01#, 16#F8#, 16#00#, 16#00#, 16#01#, 16#F0#, 16#1F#, 16#00#, 16#00#, 16#00#, 16#3F#, 16#03#, 16#F0#, 16#00#, 16#00#, 16#03#, 16#F0#, 16#3E#, 16#00#, 16#00#, 16#00#, 16#3E#, 16#07#, 16#C0#, 16#00#, 16#00#, 16#07#, 16#E0#, 16#F8#, 16#00#, 16#00#, 16#00#, 16#7E#, 16#0F#, 16#00#, 16#00#, 16#00#, 16#07#, 16#E3#, 16#E0#, 16#00#, 16#00#, 16#00#, 16#3F#, 16#F8#, 16#00#, 16#00#, 16#00#, 16#00#, 16#7E#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#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#00#, 16#00#, 16#7F#, 16#E0#, 16#00#, 16#00#, 16#00#, 16#0F#, 16#1E#, 16#00#, 16#00#, 16#00#, 16#01#, 16#E1#, 16#F0#, 16#00#, 16#00#, 16#00#, 16#3E#, 16#3F#, 16#00#, 16#00#, 16#00#, 16#07#, 16#C3#, 16#E0#, 16#00#, 16#00#, 16#00#, 16#F8#, 16#1E#, 16#00#, 16#00#, 16#00#, 16#1F#, 16#80#, 16#00#, 16#00#, 16#00#, 16#01#, 16#F8#, 16#00#, 16#00#, 16#00#, 16#00#, 16#3F#, 16#00#, 16#00#, 16#00#, 16#00#, 16#03#, 16#F0#, 16#00#, 16#00#, 16#00#, 16#00#, 16#3F#, 16#00#, 16#00#, 16#00#, 16#00#, 16#07#, 16#F0#, 16#00#, 16#00#, 16#00#, 16#00#, 16#7E#, 16#00#, 16#00#, 16#00#, 16#00#, 16#07#, 16#E0#, 16#00#, 16#00#, 16#00#, 16#00#, 16#7E#, 16#00#, 16#00#, 16#00#, 16#00#, 16#07#, 16#E0#, 16#0C#, 16#00#, 16#00#, 16#00#, 16#7E#, 16#01#, 16#80#, 16#00#, 16#00#, 16#03#, 16#F0#, 16#30#, 16#00#, 16#00#, 16#00#, 16#3F#, 16#86#, 16#00#, 16#00#, 16#00#, 16#01#, 16#FF#, 16#C0#, 16#00#, 16#00#, 16#00#, 16#0F#, 16#F8#, 16#00#, 16#00#, 16#00#, 16#00#, 16#7E#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#40#, 16#00#, 16#00#, 16#00#, 16#00#, 16#FC#, 16#00#, 16#00#, 16#00#, 16#00#, 16#FF#, 16#C0#, 16#00#, 16#00#, 16#00#, 16#01#, 16#F8#, 16#00#, 16#00#, 16#00#, 16#00#, 16#1F#, 16#80#, 16#00#, 16#00#, 16#00#, 16#01#, 16#F8#, 16#00#, 16#00#, 16#00#, 16#00#, 16#1F#, 16#80#, 16#00#, 16#00#, 16#00#, 16#01#, 16#F0#, 16#00#, 16#00#, 16#00#, 16#00#, 16#3F#, 16#00#, 16#00#, 16#00#, 16#00#, 16#03#, 16#F0#, 16#00#, 16#00#, 16#00#, 16#00#, 16#3E#, 16#00#, 16#00#, 16#00#, 16#01#, 16#F7#, 16#E0#, 16#00#, 16#00#, 16#00#, 16#7F#, 16#FE#, 16#00#, 16#00#, 16#00#, 16#0F#, 16#8F#, 16#E0#, 16#00#, 16#00#, 16#01#, 16#F0#, 16#FC#, 16#00#, 16#00#, 16#00#, 16#3E#, 16#0F#, 16#C0#, 16#00#, 16#00#, 16#07#, 16#E0#, 16#FC#, 16#00#, 16#00#, 16#00#, 16#7C#, 16#0F#, 16#C0#, 16#00#, 16#00#, 16#0F#, 16#80#, 16#F8#, 16#00#, 16#00#, 16#01#, 16#F8#, 16#0F#, 16#80#, 16#00#, 16#00#, 16#1F#, 16#81#, 16#F8#, 16#00#, 16#00#, 16#03#, 16#F0#, 16#1F#, 16#00#, 16#00#, 16#00#, 16#3F#, 16#01#, 16#F0#, 16#00#, 16#00#, 16#03#, 16#F0#, 16#3F#, 16#00#, 16#00#, 16#00#, 16#7E#, 16#03#, 16#F0#, 16#00#, 16#00#, 16#07#, 16#E0#, 16#7E#, 16#00#, 16#00#, 16#00#, 16#7E#, 16#07#, 16#E0#, 16#00#, 16#00#, 16#07#, 16#E0#, 16#FE#, 16#00#, 16#00#, 16#00#, 16#7E#, 16#0B#, 16#E6#, 16#00#, 16#00#, 16#07#, 16#E1#, 16#FC#, 16#40#, 16#00#, 16#00#, 16#7F#, 16#37#, 16#C8#, 16#00#, 16#00#, 16#03#, 16#FE#, 16#7F#, 16#80#, 16#00#, 16#00#, 16#3F#, 16#C7#, 16#F0#, 16#00#, 16#00#, 16#00#, 16#F8#, 16#3C#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#F8#, 16#00#, 16#00#, 16#00#, 16#00#, 16#7F#, 16#C0#, 16#00#, 16#00#, 16#00#, 16#0F#, 16#9E#, 16#00#, 16#00#, 16#00#, 16#01#, 16#E1#, 16#E0#, 16#00#, 16#00#, 16#00#, 16#3E#, 16#1F#, 16#00#, 16#00#, 16#00#, 16#07#, 16#C1#, 16#F0#, 16#00#, 16#00#, 16#00#, 16#FC#, 16#1E#, 16#00#, 16#00#, 16#00#, 16#0F#, 16#83#, 16#E0#, 16#00#, 16#00#, 16#01#, 16#F8#, 16#3C#, 16#00#, 16#00#, 16#00#, 16#3F#, 16#87#, 16#80#, 16#00#, 16#00#, 16#03#, 16#F1#, 16#F0#, 16#00#, 16#00#, 16#00#, 16#3F#, 16#3C#, 16#00#, 16#00#, 16#00#, 16#07#, 16#FF#, 16#00#, 16#00#, 16#00#, 16#00#, 16#7F#, 16#80#, 16#00#, 16#00#, 16#00#, 16#07#, 16#E0#, 16#00#, 16#00#, 16#00#, 16#00#, 16#7E#, 16#00#, 16#00#, 16#00#, 16#00#, 16#07#, 16#E0#, 16#18#, 16#00#, 16#00#, 16#00#, 16#7E#, 16#03#, 16#80#, 16#00#, 16#00#, 16#03#, 16#F0#, 16#30#, 16#00#, 16#00#, 16#00#, 16#3F#, 16#0E#, 16#00#, 16#00#, 16#00#, 16#01#, 16#FF#, 16#C0#, 16#00#, 16#00#, 16#00#, 16#0F#, 16#F8#, 16#00#, 16#00#, 16#00#, 16#00#, 16#7E#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#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#00#, 16#01#, 16#CF#, 16#00#, 16#00#, 16#00#, 16#00#, 16#78#, 16#F0#, 16#00#, 16#00#, 16#00#, 16#07#, 16#8F#, 16#00#, 16#00#, 16#00#, 16#00#, 16#F0#, 16#F0#, 16#00#, 16#00#, 16#00#, 16#1F#, 16#07#, 16#00#, 16#00#, 16#00#, 16#01#, 16#F0#, 16#00#, 16#00#, 16#00#, 16#00#, 16#3E#, 16#00#, 16#00#, 16#00#, 16#00#, 16#03#, 16#E0#, 16#00#, 16#00#, 16#00#, 16#00#, 16#3E#, 16#00#, 16#00#, 16#00#, 16#00#, 16#07#, 16#E0#, 16#00#, 16#00#, 16#00#, 16#03#, 16#FF#, 16#E0#, 16#00#, 16#00#, 16#00#, 16#7F#, 16#FE#, 16#00#, 16#00#, 16#00#, 16#00#, 16#7C#, 16#00#, 16#00#, 16#00#, 16#00#, 16#0F#, 16#C0#, 16#00#, 16#00#, 16#00#, 16#00#, 16#FC#, 16#00#, 16#00#, 16#00#, 16#00#, 16#0F#, 16#80#, 16#00#, 16#00#, 16#00#, 16#00#, 16#F8#, 16#00#, 16#00#, 16#00#, 16#00#, 16#1F#, 16#80#, 16#00#, 16#00#, 16#00#, 16#01#, 16#F8#, 16#00#, 16#00#, 16#00#, 16#00#, 16#1F#, 16#80#, 16#00#, 16#00#, 16#00#, 16#01#, 16#F0#, 16#00#, 16#00#, 16#00#, 16#00#, 16#3F#, 16#00#, 16#00#, 16#00#, 16#00#, 16#03#, 16#F0#, 16#00#, 16#00#, 16#00#, 16#00#, 16#3F#, 16#00#, 16#00#, 16#00#, 16#00#, 16#03#, 16#E0#, 16#00#, 16#00#, 16#00#, 16#00#, 16#3E#, 16#00#, 16#00#, 16#00#, 16#00#, 16#07#, 16#E0#, 16#00#, 16#00#, 16#00#, 16#00#, 16#7E#, 16#00#, 16#00#, 16#00#, 16#00#, 16#07#, 16#C0#, 16#00#, 16#00#, 16#00#, 16#00#, 16#7C#, 16#00#, 16#00#, 16#00#, 16#00#, 16#0F#, 16#C0#, 16#00#, 16#00#, 16#00#, 16#00#, 16#F8#, 16#00#, 16#00#, 16#00#, 16#00#, 16#0F#, 16#80#, 16#00#, 16#00#, 16#00#, 16#00#, 16#F0#, 16#00#, 16#00#, 16#00#, 16#00#, 16#1F#, 16#00#, 16#00#, 16#00#, 16#00#, 16#01#, 16#E0#, 16#00#, 16#00#, 16#00#, 16#00#, 16#1E#, 16#00#, 16#00#, 16#00#, 16#00#, 16#03#, 16#C0#, 16#00#, 16#00#, 16#00#, 16#00#, 16#F8#, 16#00#, 16#00#, 16#00#, 16#00#, 16#0E#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#03#, 16#F0#, 16#00#, 16#00#, 16#00#, 16#01#, 16#FF#, 16#C0#, 16#00#, 16#00#, 16#00#, 16#3F#, 16#1F#, 16#F0#, 16#00#, 16#00#, 16#07#, 16#E1#, 16#FF#, 16#00#, 16#00#, 16#00#, 16#FC#, 16#1F#, 16#80#, 16#00#, 16#00#, 16#0F#, 16#81#, 16#F8#, 16#00#, 16#00#, 16#01#, 16#F8#, 16#1F#, 16#80#, 16#00#, 16#00#, 16#1F#, 16#81#, 16#F8#, 16#00#, 16#00#, 16#01#, 16#F8#, 16#3F#, 16#80#, 16#00#, 16#00#, 16#1F#, 16#83#, 16#F0#, 16#00#, 16#00#, 16#00#, 16#F8#, 16#7E#, 16#00#, 16#00#, 16#00#, 16#07#, 16#8F#, 16#C0#, 16#00#, 16#00#, 16#00#, 16#3F#, 16#F8#, 16#00#, 16#00#, 16#00#, 16#03#, 16#7C#, 16#00#, 16#00#, 16#00#, 16#00#, 16#E0#, 16#00#, 16#00#, 16#00#, 16#00#, 16#1E#, 16#00#, 16#00#, 16#00#, 16#00#, 16#03#, 16#F0#, 16#00#, 16#00#, 16#00#, 16#00#, 16#3F#, 16#E0#, 16#00#, 16#00#, 16#00#, 16#03#, 16#FF#, 16#C0#, 16#00#, 16#00#, 16#00#, 16#1F#, 16#FF#, 16#00#, 16#00#, 16#00#, 16#00#, 16#FF#, 16#FC#, 16#00#, 16#00#, 16#00#, 16#1F#, 16#FF#, 16#E0#, 16#00#, 16#00#, 16#07#, 16#83#, 16#FE#, 16#00#, 16#00#, 16#00#, 16#F0#, 16#07#, 16#E0#, 16#00#, 16#00#, 16#0E#, 16#00#, 16#3E#, 16#00#, 16#00#, 16#00#, 16#E0#, 16#03#, 16#E0#, 16#00#, 16#00#, 16#0E#, 16#00#, 16#3C#, 16#00#, 16#00#, 16#00#, 16#F0#, 16#07#, 16#C0#, 16#00#, 16#00#, 16#0F#, 16#80#, 16#F8#, 16#00#, 16#00#, 16#00#, 16#7F#, 16#FE#, 16#00#, 16#00#, 16#00#, 16#00#, 16#FF#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#02#, 16#00#, 16#00#, 16#00#, 16#00#, 16#07#, 16#E0#, 16#00#, 16#00#, 16#00#, 16#03#, 16#FE#, 16#00#, 16#00#, 16#00#, 16#00#, 16#0F#, 16#E0#, 16#00#, 16#00#, 16#00#, 16#00#, 16#7C#, 16#00#, 16#00#, 16#00#, 16#00#, 16#0F#, 16#C0#, 16#00#, 16#00#, 16#00#, 16#00#, 16#FC#, 16#00#, 16#00#, 16#00#, 16#00#, 16#0F#, 16#80#, 16#00#, 16#00#, 16#00#, 16#00#, 16#F8#, 16#00#, 16#00#, 16#00#, 16#00#, 16#1F#, 16#80#, 16#00#, 16#00#, 16#00#, 16#01#, 16#F8#, 16#00#, 16#00#, 16#00#, 16#00#, 16#1F#, 16#03#, 16#C0#, 16#00#, 16#00#, 16#01#, 16#F0#, 16#FE#, 16#00#, 16#00#, 16#00#, 16#3F#, 16#1F#, 16#F0#, 16#00#, 16#00#, 16#03#, 16#F3#, 16#3F#, 16#00#, 16#00#, 16#00#, 16#3E#, 16#63#, 16#F0#, 16#00#, 16#00#, 16#03#, 16#E4#, 16#3F#, 16#00#, 16#00#, 16#00#, 16#7E#, 16#83#, 16#E0#, 16#00#, 16#00#, 16#07#, 16#F0#, 16#7E#, 16#00#, 16#00#, 16#00#, 16#7F#, 16#07#, 16#E0#, 16#00#, 16#00#, 16#0F#, 16#E0#, 16#7C#, 16#00#, 16#00#, 16#00#, 16#FE#, 16#0F#, 16#C0#, 16#00#, 16#00#, 16#0F#, 16#C0#, 16#FC#, 16#00#, 16#00#, 16#00#, 16#FC#, 16#0F#, 16#C0#, 16#00#, 16#00#, 16#1F#, 16#81#, 16#F8#, 16#00#, 16#00#, 16#01#, 16#F8#, 16#1F#, 16#80#, 16#00#, 16#00#, 16#1F#, 16#81#, 16#F8#, 16#00#, 16#00#, 16#01#, 16#F0#, 16#3F#, 16#18#, 16#00#, 16#00#, 16#3F#, 16#03#, 16#F1#, 16#00#, 16#00#, 16#03#, 16#F0#, 16#3F#, 16#30#, 16#00#, 16#00#, 16#3E#, 16#03#, 16#F6#, 16#00#, 16#00#, 16#03#, 16#E0#, 16#3F#, 16#C0#, 16#00#, 16#00#, 16#7E#, 16#03#, 16#F8#, 16#00#, 16#00#, 16#07#, 16#00#, 16#1E#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#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#00#, 16#00#, 16#FC#, 16#00#, 16#00#, 16#00#, 16#00#, 16#0F#, 16#C0#, 16#00#, 16#00#, 16#00#, 16#00#, 16#FC#, 16#00#, 16#00#, 16#00#, 16#00#, 16#0F#, 16#C0#, 16#00#, 16#00#, 16#00#, 16#00#, 16#78#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#07#, 16#00#, 16#00#, 16#00#, 16#00#, 16#1F#, 16#F0#, 16#00#, 16#00#, 16#00#, 16#00#, 16#7F#, 16#00#, 16#00#, 16#00#, 16#00#, 16#03#, 16#E0#, 16#00#, 16#00#, 16#00#, 16#00#, 16#7E#, 16#00#, 16#00#, 16#00#, 16#00#, 16#07#, 16#E0#, 16#00#, 16#00#, 16#00#, 16#00#, 16#7E#, 16#00#, 16#00#, 16#00#, 16#00#, 16#07#, 16#C0#, 16#00#, 16#00#, 16#00#, 16#00#, 16#7C#, 16#00#, 16#00#, 16#00#, 16#00#, 16#0F#, 16#C0#, 16#00#, 16#00#, 16#00#, 16#00#, 16#F8#, 16#00#, 16#00#, 16#00#, 16#00#, 16#0F#, 16#80#, 16#00#, 16#00#, 16#00#, 16#01#, 16#F8#, 16#00#, 16#00#, 16#00#, 16#00#, 16#1F#, 16#80#, 16#00#, 16#00#, 16#00#, 16#01#, 16#F0#, 16#00#, 16#00#, 16#00#, 16#00#, 16#1F#, 16#00#, 16#00#, 16#00#, 16#00#, 16#03#, 16#F0#, 16#80#, 16#00#, 16#00#, 16#00#, 16#3F#, 16#10#, 16#00#, 16#00#, 16#00#, 16#03#, 16#F3#, 16#00#, 16#00#, 16#00#, 16#00#, 16#3F#, 16#60#, 16#00#, 16#00#, 16#00#, 16#03#, 16#FC#, 16#00#, 16#00#, 16#00#, 16#00#, 16#3F#, 16#80#, 16#00#, 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#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#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#00#, 16#07#, 16#C0#, 16#00#, 16#00#, 16#00#, 16#00#, 16#FC#, 16#00#, 16#00#, 16#00#, 16#00#, 16#0F#, 16#C0#, 16#00#, 16#00#, 16#00#, 16#00#, 16#7C#, 16#00#, 16#00#, 16#00#, 16#00#, 16#07#, 16#80#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#10#, 16#00#, 16#00#, 16#00#, 16#00#, 16#3F#, 16#00#, 16#00#, 16#00#, 16#00#, 16#1F#, 16#F0#, 16#00#, 16#00#, 16#00#, 16#00#, 16#7F#, 16#00#, 16#00#, 16#00#, 16#00#, 16#03#, 16#E0#, 16#00#, 16#00#, 16#00#, 16#00#, 16#3E#, 16#00#, 16#00#, 16#00#, 16#00#, 16#07#, 16#E0#, 16#00#, 16#00#, 16#00#, 16#00#, 16#7E#, 16#00#, 16#00#, 16#00#, 16#00#, 16#07#, 16#C0#, 16#00#, 16#00#, 16#00#, 16#00#, 16#7C#, 16#00#, 16#00#, 16#00#, 16#00#, 16#0F#, 16#C0#, 16#00#, 16#00#, 16#00#, 16#00#, 16#FC#, 16#00#, 16#00#, 16#00#, 16#00#, 16#0F#, 16#80#, 16#00#, 16#00#, 16#00#, 16#00#, 16#F8#, 16#00#, 16#00#, 16#00#, 16#00#, 16#1F#, 16#80#, 16#00#, 16#00#, 16#00#, 16#01#, 16#F8#, 16#00#, 16#00#, 16#00#, 16#00#, 16#1F#, 16#00#, 16#00#, 16#00#, 16#00#, 16#01#, 16#F0#, 16#00#, 16#00#, 16#00#, 16#00#, 16#3F#, 16#00#, 16#00#, 16#00#, 16#00#, 16#03#, 16#F0#, 16#00#, 16#00#, 16#00#, 16#00#, 16#3E#, 16#00#, 16#00#, 16#00#, 16#00#, 16#03#, 16#E0#, 16#00#, 16#00#, 16#00#, 16#00#, 16#7E#, 16#00#, 16#00#, 16#00#, 16#00#, 16#07#, 16#C0#, 16#00#, 16#00#, 16#00#, 16#00#, 16#7C#, 16#00#, 16#00#, 16#00#, 16#00#, 16#0F#, 16#C0#, 16#00#, 16#00#, 16#00#, 16#00#, 16#F8#, 16#00#, 16#00#, 16#00#, 16#00#, 16#8F#, 16#80#, 16#00#, 16#00#, 16#00#, 16#09#, 16#F0#, 16#00#, 16#00#, 16#00#, 16#00#, 16#1E#, 16#00#, 16#00#, 16#00#, 16#00#, 16#0F#, 16#C0#, 16#00#, 16#00#, 16#00#, 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#02#, 16#00#, 16#00#, 16#00#, 16#00#, 16#07#, 16#E0#, 16#00#, 16#00#, 16#00#, 16#03#, 16#FE#, 16#00#, 16#00#, 16#00#, 16#00#, 16#0F#, 16#E0#, 16#00#, 16#00#, 16#00#, 16#00#, 16#7C#, 16#00#, 16#00#, 16#00#, 16#00#, 16#0F#, 16#C0#, 16#00#, 16#00#, 16#00#, 16#00#, 16#FC#, 16#00#, 16#00#, 16#00#, 16#00#, 16#0F#, 16#C0#, 16#00#, 16#00#, 16#00#, 16#00#, 16#F8#, 16#00#, 16#00#, 16#00#, 16#00#, 16#1F#, 16#80#, 16#00#, 16#00#, 16#00#, 16#01#, 16#F8#, 16#00#, 16#00#, 16#00#, 16#00#, 16#1F#, 16#00#, 16#00#, 16#00#, 16#00#, 16#01#, 16#F1#, 16#FF#, 16#80#, 16#00#, 16#00#, 16#3F#, 16#07#, 16#E0#, 16#00#, 16#00#, 16#03#, 16#F0#, 16#78#, 16#00#, 16#00#, 16#00#, 16#3E#, 16#07#, 16#00#, 16#00#, 16#00#, 16#03#, 16#E0#, 16#E0#, 16#00#, 16#00#, 16#00#, 16#7E#, 16#1C#, 16#00#, 16#00#, 16#00#, 16#07#, 16#E3#, 16#80#, 16#00#, 16#00#, 16#00#, 16#7C#, 16#E0#, 16#00#, 16#00#, 16#00#, 16#0F#, 16#DF#, 16#00#, 16#00#, 16#00#, 16#00#, 16#FF#, 16#F0#, 16#00#, 16#00#, 16#00#, 16#0F#, 16#FF#, 16#00#, 16#00#, 16#00#, 16#00#, 16#FF#, 16#F0#, 16#00#, 16#00#, 16#00#, 16#1F#, 16#9F#, 16#00#, 16#00#, 16#00#, 16#01#, 16#F9#, 16#F8#, 16#00#, 16#00#, 16#00#, 16#1F#, 16#1F#, 16#80#, 16#00#, 16#00#, 16#01#, 16#F0#, 16#F8#, 16#00#, 16#00#, 16#00#, 16#3F#, 16#0F#, 16#82#, 16#00#, 16#00#, 16#03#, 16#F0#, 16#FC#, 16#40#, 16#00#, 16#00#, 16#3E#, 16#07#, 16#CC#, 16#00#, 16#00#, 16#03#, 16#E0#, 16#7F#, 16#80#, 16#00#, 16#00#, 16#7E#, 16#03#, 16#F0#, 16#00#, 16#00#, 16#07#, 16#00#, 16#1E#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#02#, 16#00#, 16#00#, 16#00#, 16#00#, 16#07#, 16#E0#, 16#00#, 16#00#, 16#00#, 16#03#, 16#FE#, 16#00#, 16#00#, 16#00#, 16#00#, 16#0F#, 16#E0#, 16#00#, 16#00#, 16#00#, 16#00#, 16#7C#, 16#00#, 16#00#, 16#00#, 16#00#, 16#0F#, 16#C0#, 16#00#, 16#00#, 16#00#, 16#00#, 16#FC#, 16#00#, 16#00#, 16#00#, 16#00#, 16#0F#, 16#80#, 16#00#, 16#00#, 16#00#, 16#00#, 16#F8#, 16#00#, 16#00#, 16#00#, 16#00#, 16#1F#, 16#80#, 16#00#, 16#00#, 16#00#, 16#01#, 16#F8#, 16#00#, 16#00#, 16#00#, 16#00#, 16#1F#, 16#00#, 16#00#, 16#00#, 16#00#, 16#01#, 16#F0#, 16#00#, 16#00#, 16#00#, 16#00#, 16#3F#, 16#00#, 16#00#, 16#00#, 16#00#, 16#03#, 16#F0#, 16#00#, 16#00#, 16#00#, 16#00#, 16#3E#, 16#00#, 16#00#, 16#00#, 16#00#, 16#07#, 16#E0#, 16#00#, 16#00#, 16#00#, 16#00#, 16#7E#, 16#00#, 16#00#, 16#00#, 16#00#, 16#07#, 16#C0#, 16#00#, 16#00#, 16#00#, 16#00#, 16#7C#, 16#00#, 16#00#, 16#00#, 16#00#, 16#0F#, 16#C0#, 16#00#, 16#00#, 16#00#, 16#00#, 16#FC#, 16#00#, 16#00#, 16#00#, 16#00#, 16#0F#, 16#80#, 16#00#, 16#00#, 16#00#, 16#01#, 16#F8#, 16#00#, 16#00#, 16#00#, 16#00#, 16#1F#, 16#80#, 16#00#, 16#00#, 16#00#, 16#01#, 16#F8#, 16#00#, 16#00#, 16#00#, 16#00#, 16#1F#, 16#00#, 16#00#, 16#00#, 16#00#, 16#01#, 16#F0#, 16#80#, 16#00#, 16#00#, 16#00#, 16#3F#, 16#18#, 16#00#, 16#00#, 16#00#, 16#03#, 16#F3#, 16#00#, 16#00#, 16#00#, 16#00#, 16#3F#, 16#60#, 16#00#, 16#00#, 16#00#, 16#03#, 16#FC#, 16#00#, 16#00#, 16#00#, 16#00#, 16#3F#, 16#80#, 16#00#, 16#00#, 16#00#, 16#01#, 16#F0#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#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#07#, 16#80#, 16#F8#, 16#00#, 16#1F#, 16#F1#, 16#FC#, 16#3F#, 16#C0#, 16#00#, 16#7E#, 16#3F#, 16#E7#, 16#FC#, 16#00#, 16#07#, 16#E6#, 16#7C#, 16#4F#, 16#C0#, 16#00#, 16#7E#, 16#47#, 16#C8#, 16#FC#, 16#00#, 16#07#, 16#C8#, 16#7D#, 16#0F#, 16#C0#, 16#00#, 16#7D#, 16#0F#, 16#E0#, 16#FC#, 16#00#, 16#0F#, 16#E0#, 16#FA#, 16#0F#, 16#80#, 16#00#, 16#FE#, 16#0F#, 16#C1#, 16#F8#, 16#00#, 16#0F#, 16#C0#, 16#FC#, 16#1F#, 16#80#, 16#00#, 16#FC#, 16#1F#, 16#81#, 16#F8#, 16#00#, 16#1F#, 16#C1#, 16#F8#, 16#3F#, 16#00#, 16#01#, 16#F8#, 16#1F#, 16#03#, 16#F0#, 16#00#, 16#1F#, 16#83#, 16#F0#, 16#3F#, 16#00#, 16#01#, 16#F0#, 16#3F#, 16#07#, 16#E0#, 16#00#, 16#3F#, 16#03#, 16#E0#, 16#7E#, 16#00#, 16#03#, 16#F0#, 16#7E#, 16#07#, 16#E2#, 16#00#, 16#3E#, 16#07#, 16#E0#, 16#7C#, 16#60#, 16#03#, 16#E0#, 16#7C#, 16#07#, 16#CC#, 16#00#, 16#7E#, 16#07#, 16#C0#, 16#FC#, 16#80#, 16#07#, 16#E0#, 16#FC#, 16#0F#, 16#F8#, 16#00#, 16#7C#, 16#0F#, 16#C0#, 16#7F#, 16#00#, 16#06#, 16#00#, 16#00#, 16#07#, 16#C0#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#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#07#, 16#C0#, 16#00#, 16#00#, 16#1F#, 16#F1#, 16#FE#, 16#00#, 16#00#, 16#00#, 16#7E#, 16#3F#, 16#E0#, 16#00#, 16#00#, 16#07#, 16#E6#, 16#7E#, 16#00#, 16#00#, 16#00#, 16#7E#, 16#47#, 16#E0#, 16#00#, 16#00#, 16#07#, 16#C8#, 16#7E#, 16#00#, 16#00#, 16#00#, 16#7D#, 16#07#, 16#E0#, 16#00#, 16#00#, 16#0F#, 16#F0#, 16#7C#, 16#00#, 16#00#, 16#00#, 16#FA#, 16#0F#, 16#C0#, 16#00#, 16#00#, 16#0F#, 16#C0#, 16#FC#, 16#00#, 16#00#, 16#00#, 16#FC#, 16#0F#, 16#80#, 16#00#, 16#00#, 16#1F#, 16#C1#, 16#F8#, 16#00#, 16#00#, 16#01#, 16#F8#, 16#1F#, 16#80#, 16#00#, 16#00#, 16#1F#, 16#81#, 16#F0#, 16#00#, 16#00#, 16#01#, 16#F0#, 16#3F#, 16#00#, 16#00#, 16#00#, 16#3F#, 16#03#, 16#F0#, 16#00#, 16#00#, 16#03#, 16#F0#, 16#3E#, 16#10#, 16#00#, 16#00#, 16#3E#, 16#03#, 16#E2#, 16#00#, 16#00#, 16#03#, 16#E0#, 16#7E#, 16#60#, 16#00#, 16#00#, 16#7E#, 16#07#, 16#E4#, 16#00#, 16#00#, 16#07#, 16#E0#, 16#7F#, 16#80#, 16#00#, 16#00#, 16#7C#, 16#07#, 16#F0#, 16#00#, 16#00#, 16#06#, 16#00#, 16#3E#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#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#00#, 16#78#, 16#E0#, 16#00#, 16#00#, 16#00#, 16#0F#, 16#0F#, 16#00#, 16#00#, 16#00#, 16#01#, 16#E0#, 16#F8#, 16#00#, 16#00#, 16#00#, 16#3C#, 16#0F#, 16#C0#, 16#00#, 16#00#, 16#07#, 16#C0#, 16#FC#, 16#00#, 16#00#, 16#00#, 16#F8#, 16#0F#, 16#C0#, 16#00#, 16#00#, 16#1F#, 16#80#, 16#FC#, 16#00#, 16#00#, 16#01#, 16#F8#, 16#0F#, 16#C0#, 16#00#, 16#00#, 16#3F#, 16#00#, 16#FC#, 16#00#, 16#00#, 16#03#, 16#F0#, 16#0F#, 16#C0#, 16#00#, 16#00#, 16#3F#, 16#01#, 16#F8#, 16#00#, 16#00#, 16#03#, 16#E0#, 16#1F#, 16#80#, 16#00#, 16#00#, 16#7E#, 16#01#, 16#F8#, 16#00#, 16#00#, 16#07#, 16#E0#, 16#1F#, 16#00#, 16#00#, 16#00#, 16#7E#, 16#03#, 16#F0#, 16#00#, 16#00#, 16#07#, 16#E0#, 16#3E#, 16#00#, 16#00#, 16#00#, 16#7E#, 16#07#, 16#E0#, 16#00#, 16#00#, 16#03#, 16#E0#, 16#7C#, 16#00#, 16#00#, 16#00#, 16#3E#, 16#0F#, 16#80#, 16#00#, 16#00#, 16#01#, 16#E0#, 16#F0#, 16#00#, 16#00#, 16#00#, 16#0F#, 16#1C#, 16#00#, 16#00#, 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#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#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#1F#, 16#00#, 16#00#, 16#00#, 16#1F#, 16#E3#, 16#F8#, 16#00#, 16#00#, 16#00#, 16#7E#, 16#FF#, 16#C0#, 16#00#, 16#00#, 16#07#, 16#E8#, 16#FE#, 16#00#, 16#00#, 16#00#, 16#7D#, 16#07#, 16#E0#, 16#00#, 16#00#, 16#07#, 16#E0#, 16#7E#, 16#00#, 16#00#, 16#00#, 16#7E#, 16#07#, 16#E0#, 16#00#, 16#00#, 16#07#, 16#C0#, 16#7E#, 16#00#, 16#00#, 16#00#, 16#FC#, 16#0F#, 16#E0#, 16#00#, 16#00#, 16#0F#, 16#C0#, 16#FC#, 16#00#, 16#00#, 16#00#, 16#F8#, 16#0F#, 16#C0#, 16#00#, 16#00#, 16#0F#, 16#80#, 16#FC#, 16#00#, 16#00#, 16#01#, 16#F8#, 16#1F#, 16#80#, 16#00#, 16#00#, 16#1F#, 16#81#, 16#F8#, 16#00#, 16#00#, 16#01#, 16#F0#, 16#1F#, 16#80#, 16#00#, 16#00#, 16#1F#, 16#03#, 16#F0#, 16#00#, 16#00#, 16#03#, 16#F0#, 16#3E#, 16#00#, 16#00#, 16#00#, 16#3E#, 16#07#, 16#E0#, 16#00#, 16#00#, 16#03#, 16#E0#, 16#7C#, 16#00#, 16#00#, 16#00#, 16#7E#, 16#0F#, 16#80#, 16#00#, 16#00#, 16#07#, 16#F1#, 16#F0#, 16#00#, 16#00#, 16#00#, 16#7F#, 16#FE#, 16#00#, 16#00#, 16#00#, 16#07#, 16#CF#, 16#80#, 16#00#, 16#00#, 16#00#, 16#FC#, 16#00#, 16#00#, 16#00#, 16#00#, 16#0F#, 16#C0#, 16#00#, 16#00#, 16#00#, 16#00#, 16#F8#, 16#00#, 16#00#, 16#00#, 16#00#, 16#0F#, 16#80#, 16#00#, 16#00#, 16#00#, 16#00#, 16#F8#, 16#00#, 16#00#, 16#00#, 16#00#, 16#0F#, 16#80#, 16#00#, 16#00#, 16#00#, 16#00#, 16#F8#, 16#00#, 16#00#, 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#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#01#, 16#F0#, 16#00#, 16#00#, 16#00#, 16#00#, 16#7F#, 16#BE#, 16#00#, 16#00#, 16#00#, 16#0F#, 16#8B#, 16#E0#, 16#00#, 16#00#, 16#01#, 16#F0#, 16#FC#, 16#00#, 16#00#, 16#00#, 16#3E#, 16#0F#, 16#C0#, 16#00#, 16#00#, 16#07#, 16#E0#, 16#FC#, 16#00#, 16#00#, 16#00#, 16#FC#, 16#0F#, 16#C0#, 16#00#, 16#00#, 16#0F#, 16#80#, 16#F8#, 16#00#, 16#00#, 16#01#, 16#F8#, 16#0F#, 16#80#, 16#00#, 16#00#, 16#1F#, 16#81#, 16#F8#, 16#00#, 16#00#, 16#03#, 16#F0#, 16#1F#, 16#00#, 16#00#, 16#00#, 16#3F#, 16#01#, 16#F0#, 16#00#, 16#00#, 16#03#, 16#F0#, 16#3F#, 16#00#, 16#00#, 16#00#, 16#7E#, 16#03#, 16#F0#, 16#00#, 16#00#, 16#07#, 16#E0#, 16#7E#, 16#00#, 16#00#, 16#00#, 16#7E#, 16#07#, 16#E0#, 16#00#, 16#00#, 16#07#, 16#E0#, 16#FE#, 16#00#, 16#00#, 16#00#, 16#7E#, 16#0F#, 16#C0#, 16#00#, 16#00#, 16#07#, 16#E1#, 16#FC#, 16#00#, 16#00#, 16#00#, 16#7E#, 16#3F#, 16#C0#, 16#00#, 16#00#, 16#03#, 16#FE#, 16#F8#, 16#00#, 16#00#, 16#00#, 16#3F#, 16#CF#, 16#80#, 16#00#, 16#00#, 16#00#, 16#F0#, 16#F8#, 16#00#, 16#00#, 16#00#, 16#00#, 16#1F#, 16#80#, 16#00#, 16#00#, 16#00#, 16#01#, 16#F0#, 16#00#, 16#00#, 16#00#, 16#00#, 16#1F#, 16#00#, 16#00#, 16#00#, 16#00#, 16#03#, 16#F0#, 16#00#, 16#00#, 16#00#, 16#00#, 16#3F#, 16#00#, 16#00#, 16#00#, 16#00#, 16#07#, 16#E0#, 16#00#, 16#00#, 16#00#, 16#00#, 16#7F#, 16#00#, 16#00#, 16#00#, 16#00#, 16#3F#, 16#FC#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#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#1E#, 16#00#, 16#00#, 16#00#, 16#1F#, 16#F3#, 16#E0#, 16#00#, 16#00#, 16#00#, 16#7E#, 16#7F#, 16#00#, 16#00#, 16#00#, 16#07#, 16#EF#, 16#F0#, 16#00#, 16#00#, 16#00#, 16#7E#, 16#9E#, 16#00#, 16#00#, 16#00#, 16#07#, 16#D0#, 16#E0#, 16#00#, 16#00#, 16#00#, 16#7D#, 16#00#, 16#00#, 16#00#, 16#00#, 16#0F#, 16#E0#, 16#00#, 16#00#, 16#00#, 16#00#, 16#FE#, 16#00#, 16#00#, 16#00#, 16#00#, 16#0F#, 16#C0#, 16#00#, 16#00#, 16#00#, 16#00#, 16#FC#, 16#00#, 16#00#, 16#00#, 16#00#, 16#1F#, 16#C0#, 16#00#, 16#00#, 16#00#, 16#01#, 16#F8#, 16#00#, 16#00#, 16#00#, 16#00#, 16#1F#, 16#80#, 16#00#, 16#00#, 16#00#, 16#01#, 16#F0#, 16#00#, 16#00#, 16#00#, 16#00#, 16#3F#, 16#00#, 16#00#, 16#00#, 16#00#, 16#03#, 16#F0#, 16#00#, 16#00#, 16#00#, 16#00#, 16#3F#, 16#00#, 16#00#, 16#00#, 16#00#, 16#07#, 16#E0#, 16#00#, 16#00#, 16#00#, 16#00#, 16#7E#, 16#00#, 16#00#, 16#00#, 16#00#, 16#07#, 16#E0#, 16#00#, 16#00#, 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#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#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#10#, 16#00#, 16#00#, 16#00#, 16#07#, 16#FF#, 16#00#, 16#00#, 16#00#, 16#00#, 16#F8#, 16#F0#, 16#00#, 16#00#, 16#00#, 16#0F#, 16#07#, 16#00#, 16#00#, 16#00#, 16#01#, 16#F0#, 16#70#, 16#00#, 16#00#, 16#00#, 16#1F#, 16#03#, 16#00#, 16#00#, 16#00#, 16#01#, 16#F0#, 16#30#, 16#00#, 16#00#, 16#00#, 16#1F#, 16#83#, 16#00#, 16#00#, 16#00#, 16#01#, 16#FC#, 16#00#, 16#00#, 16#00#, 16#00#, 16#0F#, 16#C0#, 16#00#, 16#00#, 16#00#, 16#00#, 16#FE#, 16#00#, 16#00#, 16#00#, 16#00#, 16#07#, 16#F0#, 16#00#, 16#00#, 16#00#, 16#00#, 16#7F#, 16#00#, 16#00#, 16#00#, 16#00#, 16#03#, 16#F8#, 16#00#, 16#00#, 16#00#, 16#00#, 16#1F#, 16#80#, 16#00#, 16#00#, 16#00#, 16#00#, 16#FC#, 16#00#, 16#00#, 16#00#, 16#04#, 16#0F#, 16#C0#, 16#00#, 16#00#, 16#00#, 16#60#, 16#7C#, 16#00#, 16#00#, 16#00#, 16#06#, 16#07#, 16#C0#, 16#00#, 16#00#, 16#00#, 16#60#, 16#78#, 16#00#, 16#00#, 16#00#, 16#0F#, 16#07#, 16#80#, 16#00#, 16#00#, 16#00#, 16#F8#, 16#F0#, 16#00#, 16#00#, 16#00#, 16#0C#, 16#FC#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#C0#, 16#00#, 16#00#, 16#00#, 16#00#, 16#18#, 16#00#, 16#00#, 16#00#, 16#00#, 16#03#, 16#80#, 16#00#, 16#00#, 16#00#, 16#00#, 16#78#, 16#00#, 16#00#, 16#00#, 16#00#, 16#0F#, 16#80#, 16#00#, 16#00#, 16#00#, 16#01#, 16#F0#, 16#00#, 16#00#, 16#00#, 16#00#, 16#7F#, 16#00#, 16#00#, 16#00#, 16#00#, 16#1F#, 16#FE#, 16#00#, 16#00#, 16#00#, 16#01#, 16#FF#, 16#E0#, 16#00#, 16#00#, 16#00#, 16#03#, 16#E0#, 16#00#, 16#00#, 16#00#, 16#00#, 16#7E#, 16#00#, 16#00#, 16#00#, 16#00#, 16#07#, 16#E0#, 16#00#, 16#00#, 16#00#, 16#00#, 16#7C#, 16#00#, 16#00#, 16#00#, 16#00#, 16#07#, 16#C0#, 16#00#, 16#00#, 16#00#, 16#00#, 16#FC#, 16#00#, 16#00#, 16#00#, 16#00#, 16#0F#, 16#80#, 16#00#, 16#00#, 16#00#, 16#00#, 16#F8#, 16#00#, 16#00#, 16#00#, 16#00#, 16#1F#, 16#80#, 16#00#, 16#00#, 16#00#, 16#01#, 16#F8#, 16#00#, 16#00#, 16#00#, 16#00#, 16#1F#, 16#00#, 16#00#, 16#00#, 16#00#, 16#01#, 16#F0#, 16#00#, 16#00#, 16#00#, 16#00#, 16#3F#, 16#00#, 16#00#, 16#00#, 16#00#, 16#03#, 16#F1#, 16#00#, 16#00#, 16#00#, 16#00#, 16#3E#, 16#10#, 16#00#, 16#00#, 16#00#, 16#03#, 16#E2#, 16#00#, 16#00#, 16#00#, 16#00#, 16#3E#, 16#60#, 16#00#, 16#00#, 16#00#, 16#03#, 16#FC#, 16#00#, 16#00#, 16#00#, 16#00#, 16#3F#, 16#80#, 16#00#, 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#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#01#, 16#F0#, 16#3F#, 16#00#, 16#00#, 16#01#, 16#FF#, 16#03#, 16#E0#, 16#00#, 16#00#, 16#07#, 16#E0#, 16#3E#, 16#00#, 16#00#, 16#00#, 16#7E#, 16#07#, 16#E0#, 16#00#, 16#00#, 16#07#, 16#E0#, 16#7E#, 16#00#, 16#00#, 16#00#, 16#7E#, 16#07#, 16#C0#, 16#00#, 16#00#, 16#07#, 16#C0#, 16#FC#, 16#00#, 16#00#, 16#00#, 16#FC#, 16#0F#, 16#C0#, 16#00#, 16#00#, 16#0F#, 16#C0#, 16#F8#, 16#00#, 16#00#, 16#00#, 16#F8#, 16#1F#, 16#80#, 16#00#, 16#00#, 16#1F#, 16#81#, 16#F8#, 16#00#, 16#00#, 16#01#, 16#F8#, 16#1F#, 16#80#, 16#00#, 16#00#, 16#1F#, 16#83#, 16#F0#, 16#00#, 16#00#, 16#01#, 16#F0#, 16#5F#, 16#00#, 16#00#, 16#00#, 16#3F#, 16#07#, 16#F0#, 16#00#, 16#00#, 16#03#, 16#F0#, 16#BE#, 16#00#, 16#00#, 16#00#, 16#3E#, 16#13#, 16#E3#, 16#00#, 16#00#, 16#03#, 16#E1#, 16#3E#, 16#20#, 16#00#, 16#00#, 16#3E#, 16#67#, 16#E4#, 16#00#, 16#00#, 16#03#, 16#FC#, 16#7F#, 16#C0#, 16#00#, 16#00#, 16#3F#, 16#83#, 16#F0#, 16#00#, 16#00#, 16#01#, 16#F0#, 16#3E#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#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#0E#, 16#00#, 16#00#, 16#00#, 16#07#, 16#C0#, 16#F0#, 16#00#, 16#00#, 16#01#, 16#FC#, 16#1F#, 16#00#, 16#00#, 16#00#, 16#0F#, 16#E1#, 16#F8#, 16#00#, 16#00#, 16#00#, 16#7E#, 16#0F#, 16#80#, 16#00#, 16#00#, 16#07#, 16#E0#, 16#F0#, 16#00#, 16#00#, 16#00#, 16#3E#, 16#07#, 16#00#, 16#00#, 16#00#, 16#03#, 16#E0#, 16#70#, 16#00#, 16#00#, 16#00#, 16#3E#, 16#06#, 16#00#, 16#00#, 16#00#, 16#03#, 16#E0#, 16#60#, 16#00#, 16#00#, 16#00#, 16#3E#, 16#0C#, 16#00#, 16#00#, 16#00#, 16#03#, 16#E1#, 16#80#, 16#00#, 16#00#, 16#00#, 16#3E#, 16#38#, 16#00#, 16#00#, 16#00#, 16#03#, 16#E3#, 16#00#, 16#00#, 16#00#, 16#00#, 16#3E#, 16#60#, 16#00#, 16#00#, 16#00#, 16#03#, 16#EC#, 16#00#, 16#00#, 16#00#, 16#00#, 16#3F#, 16#80#, 16#00#, 16#00#, 16#00#, 16#03#, 16#F0#, 16#00#, 16#00#, 16#00#, 16#00#, 16#3F#, 16#00#, 16#00#, 16#00#, 16#00#, 16#03#, 16#E0#, 16#00#, 16#00#, 16#00#, 16#00#, 16#3C#, 16#00#, 16#00#, 16#00#, 16#00#, 16#03#, 16#80#, 16#00#, 16#00#, 16#00#, 16#00#, 16#30#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#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#03#, 16#03#, 16#80#, 16#00#, 16#07#, 16#C0#, 16#30#, 16#3C#, 16#00#, 16#01#, 16#FC#, 16#07#, 16#07#, 16#E0#, 16#00#, 16#07#, 16#E0#, 16#70#, 16#7E#, 16#00#, 16#00#, 16#7E#, 16#0F#, 16#07#, 16#E0#, 16#00#, 16#07#, 16#E0#, 16#F0#, 16#3C#, 16#00#, 16#00#, 16#3E#, 16#1F#, 16#81#, 16#C0#, 16#00#, 16#03#, 16#E1#, 16#F8#, 16#1C#, 16#00#, 16#00#, 16#3E#, 16#3F#, 16#81#, 16#80#, 16#00#, 16#03#, 16#E2#, 16#F8#, 16#38#, 16#00#, 16#00#, 16#3E#, 16#6F#, 16#83#, 16#00#, 16#00#, 16#03#, 16#EC#, 16#F8#, 16#60#, 16#00#, 16#00#, 16#3E#, 16#CF#, 16#8E#, 16#00#, 16#00#, 16#03#, 16#F8#, 16#F8#, 16#C0#, 16#00#, 16#00#, 16#3F#, 16#8F#, 16#98#, 16#00#, 16#00#, 16#03#, 16#F0#, 16#FB#, 16#00#, 16#00#, 16#00#, 16#3F#, 16#0F#, 16#F0#, 16#00#, 16#00#, 16#03#, 16#E0#, 16#FE#, 16#00#, 16#00#, 16#00#, 16#3C#, 16#0F#, 16#C0#, 16#00#, 16#00#, 16#03#, 16#C0#, 16#F8#, 16#00#, 16#00#, 16#00#, 16#38#, 16#0F#, 16#00#, 16#00#, 16#00#, 16#03#, 16#80#, 16#E0#, 16#00#, 16#00#, 16#00#, 16#30#, 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#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#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#03#, 16#C0#, 16#00#, 16#00#, 16#1F#, 16#E0#, 16#7C#, 16#00#, 16#00#, 16#00#, 16#3F#, 16#0F#, 16#E0#, 16#00#, 16#00#, 16#03#, 16#F1#, 16#FE#, 16#00#, 16#00#, 16#00#, 16#1F#, 16#31#, 16#C0#, 16#00#, 16#00#, 16#01#, 16#F6#, 16#00#, 16#00#, 16#00#, 16#00#, 16#1F#, 16#E0#, 16#00#, 16#00#, 16#00#, 16#01#, 16#FC#, 16#00#, 16#00#, 16#00#, 16#00#, 16#0F#, 16#80#, 16#00#, 16#00#, 16#00#, 16#00#, 16#F8#, 16#00#, 16#00#, 16#00#, 16#00#, 16#0F#, 16#80#, 16#00#, 16#00#, 16#00#, 16#00#, 16#FC#, 16#00#, 16#00#, 16#00#, 16#00#, 16#0F#, 16#C0#, 16#00#, 16#00#, 16#00#, 16#00#, 16#FC#, 16#00#, 16#00#, 16#00#, 16#00#, 16#0F#, 16#C0#, 16#00#, 16#00#, 16#00#, 16#01#, 16#FC#, 16#00#, 16#00#, 16#00#, 16#00#, 16#37#, 16#E0#, 16#00#, 16#00#, 16#00#, 16#03#, 16#7E#, 16#10#, 16#00#, 16#00#, 16#0E#, 16#63#, 16#E3#, 16#00#, 16#00#, 16#00#, 16#FE#, 16#3E#, 16#60#, 16#00#, 16#00#, 16#0F#, 16#C3#, 16#FC#, 16#00#, 16#00#, 16#00#, 16#F8#, 16#1F#, 16#80#, 16#00#, 16#00#, 16#0F#, 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#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#1C#, 16#0E#, 16#00#, 16#00#, 16#00#, 16#1F#, 16#C1#, 16#F0#, 16#00#, 16#00#, 16#00#, 16#FC#, 16#1F#, 16#00#, 16#00#, 16#00#, 16#07#, 16#E1#, 16#F0#, 16#00#, 16#00#, 16#00#, 16#7E#, 16#0F#, 16#00#, 16#00#, 16#00#, 16#03#, 16#E0#, 16#70#, 16#00#, 16#00#, 16#00#, 16#3E#, 16#07#, 16#00#, 16#00#, 16#00#, 16#03#, 16#F0#, 16#60#, 16#00#, 16#00#, 16#00#, 16#3F#, 16#06#, 16#00#, 16#00#, 16#00#, 16#01#, 16#F0#, 16#40#, 16#00#, 16#00#, 16#00#, 16#1F#, 16#0C#, 16#00#, 16#00#, 16#00#, 16#01#, 16#F0#, 16#C0#, 16#00#, 16#00#, 16#00#, 16#1F#, 16#98#, 16#00#, 16#00#, 16#00#, 16#01#, 16#F9#, 16#80#, 16#00#, 16#00#, 16#00#, 16#0F#, 16#B0#, 16#00#, 16#00#, 16#00#, 16#00#, 16#FB#, 16#00#, 16#00#, 16#00#, 16#00#, 16#0F#, 16#E0#, 16#00#, 16#00#, 16#00#, 16#00#, 16#FE#, 16#00#, 16#00#, 16#00#, 16#00#, 16#0F#, 16#C0#, 16#00#, 16#00#, 16#00#, 16#00#, 16#F8#, 16#00#, 16#00#, 16#00#, 16#00#, 16#0F#, 16#80#, 16#00#, 16#00#, 16#00#, 16#00#, 16#70#, 16#00#, 16#00#, 16#00#, 16#00#, 16#06#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#E0#, 16#00#, 16#00#, 16#00#, 16#00#, 16#0C#, 16#00#, 16#00#, 16#00#, 16#00#, 16#01#, 16#80#, 16#00#, 16#00#, 16#00#, 16#0C#, 16#10#, 16#00#, 16#00#, 16#00#, 16#00#, 16#E2#, 16#00#, 16#00#, 16#00#, 16#00#, 16#0F#, 16#C0#, 16#00#, 16#00#, 16#00#, 16#00#, 16#F8#, 16#00#, 16#00#, 16#00#, 16#00#, 16#0E#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#0F#, 16#FF#, 16#E0#, 16#00#, 16#00#, 16#00#, 16#FF#, 16#FC#, 16#00#, 16#00#, 16#00#, 16#0F#, 16#FF#, 16#C0#, 16#00#, 16#00#, 16#00#, 16#FF#, 16#F8#, 16#00#, 16#00#, 16#00#, 16#18#, 16#07#, 16#00#, 16#00#, 16#00#, 16#01#, 16#80#, 16#60#, 16#00#, 16#00#, 16#00#, 16#10#, 16#0C#, 16#00#, 16#00#, 16#00#, 16#00#, 16#01#, 16#80#, 16#00#, 16#00#, 16#00#, 16#00#, 16#38#, 16#00#, 16#00#, 16#00#, 16#00#, 16#07#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#60#, 16#00#, 16#00#, 16#00#, 16#00#, 16#0C#, 16#00#, 16#00#, 16#00#, 16#00#, 16#01#, 16#80#, 16#00#, 16#00#, 16#00#, 16#00#, 16#38#, 16#00#, 16#00#, 16#00#, 16#00#, 16#03#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#60#, 16#00#, 16#00#, 16#00#, 16#00#, 16#0C#, 16#00#, 16#00#, 16#00#, 16#00#, 16#01#, 16#F0#, 16#00#, 16#00#, 16#00#, 16#00#, 16#3F#, 16#80#, 16#00#, 16#00#, 16#00#, 16#03#, 16#FC#, 16#38#, 16#00#, 16#00#, 16#00#, 16#7F#, 16#E3#, 16#C0#, 16#00#, 16#00#, 16#0E#, 16#FE#, 16#7C#, 16#00#, 16#00#, 16#00#, 16#03#, 16#E3#, 16#C0#, 16#00#, 16#00#, 16#00#, 16#0F#, 16#38#, 16#00#, 16#00#, 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#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#1F#, 16#00#, 16#00#, 16#00#, 16#00#, 16#0F#, 16#C0#, 16#00#, 16#00#, 16#00#, 16#01#, 16#F0#, 16#00#, 16#00#, 16#00#, 16#00#, 16#3E#, 16#00#, 16#00#, 16#00#, 16#00#, 16#03#, 16#E0#, 16#00#, 16#00#, 16#00#, 16#00#, 16#7C#, 16#00#, 16#00#, 16#00#, 16#00#, 16#07#, 16#C0#, 16#00#, 16#00#, 16#00#, 16#00#, 16#7C#, 16#00#, 16#00#, 16#00#, 16#00#, 16#0F#, 16#80#, 16#00#, 16#00#, 16#00#, 16#00#, 16#F8#, 16#00#, 16#00#, 16#00#, 16#00#, 16#0F#, 16#80#, 16#00#, 16#00#, 16#00#, 16#00#, 16#F0#, 16#00#, 16#00#, 16#00#, 16#00#, 16#1F#, 16#00#, 16#00#, 16#00#, 16#00#, 16#01#, 16#F0#, 16#00#, 16#00#, 16#00#, 16#00#, 16#1F#, 16#00#, 16#00#, 16#00#, 16#00#, 16#03#, 16#E0#, 16#00#, 16#00#, 16#00#, 16#00#, 16#3E#, 16#00#, 16#00#, 16#00#, 16#00#, 16#07#, 16#C0#, 16#00#, 16#00#, 16#00#, 16#00#, 16#F8#, 16#00#, 16#00#, 16#00#, 16#00#, 16#3E#, 16#00#, 16#00#, 16#00#, 16#00#, 16#07#, 16#C0#, 16#00#, 16#00#, 16#00#, 16#00#, 16#0F#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#F8#, 16#00#, 16#00#, 16#00#, 16#00#, 16#0F#, 16#80#, 16#00#, 16#00#, 16#00#, 16#00#, 16#F8#, 16#00#, 16#00#, 16#00#, 16#00#, 16#0F#, 16#80#, 16#00#, 16#00#, 16#00#, 16#01#, 16#F0#, 16#00#, 16#00#, 16#00#, 16#00#, 16#1F#, 16#00#, 16#00#, 16#00#, 16#00#, 16#01#, 16#F0#, 16#00#, 16#00#, 16#00#, 16#00#, 16#1F#, 16#00#, 16#00#, 16#00#, 16#00#, 16#03#, 16#E0#, 16#00#, 16#00#, 16#00#, 16#00#, 16#3E#, 16#00#, 16#00#, 16#00#, 16#00#, 16#03#, 16#E0#, 16#00#, 16#00#, 16#00#, 16#00#, 16#3E#, 16#00#, 16#00#, 16#00#, 16#00#, 16#03#, 16#C0#, 16#00#, 16#00#, 16#00#, 16#00#, 16#7C#, 16#00#, 16#00#, 16#00#, 16#00#, 16#07#, 16#C0#, 16#00#, 16#00#, 16#00#, 16#00#, 16#7C#, 16#00#, 16#00#, 16#00#, 16#00#, 16#03#, 16#E0#, 16#00#, 16#00#, 16#00#, 16#00#, 16#3F#, 16#00#, 16#00#, 16#00#, 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#00#, 16#00#, 16#00#, 16#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#00#, 16#00#, 16#00#, 16#07#, 16#C0#, 16#00#, 16#00#, 16#00#, 16#00#, 16#7C#, 16#00#, 16#00#, 16#00#, 16#00#, 16#07#, 16#C0#, 16#00#, 16#00#, 16#00#, 16#00#, 16#7C#, 16#00#, 16#00#, 16#00#, 16#00#, 16#07#, 16#C0#, 16#00#, 16#00#, 16#00#, 16#00#, 16#7C#, 16#00#, 16#00#, 16#00#, 16#00#, 16#07#, 16#C0#, 16#00#, 16#00#, 16#00#, 16#00#, 16#7C#, 16#00#, 16#00#, 16#00#, 16#00#, 16#07#, 16#C0#, 16#00#, 16#00#, 16#00#, 16#00#, 16#7C#, 16#00#, 16#00#, 16#00#, 16#00#, 16#07#, 16#C0#, 16#00#, 16#00#, 16#00#, 16#00#, 16#7C#, 16#00#, 16#00#, 16#00#, 16#00#, 16#07#, 16#C0#, 16#00#, 16#00#, 16#00#, 16#00#, 16#7C#, 16#00#, 16#00#, 16#00#, 16#00#, 16#07#, 16#C0#, 16#00#, 16#00#, 16#00#, 16#00#, 16#7C#, 16#00#, 16#00#, 16#00#, 16#00#, 16#07#, 16#C0#, 16#00#, 16#00#, 16#00#, 16#00#, 16#7C#, 16#00#, 16#00#, 16#00#, 16#00#, 16#07#, 16#C0#, 16#00#, 16#00#, 16#00#, 16#00#, 16#7C#, 16#00#, 16#00#, 16#00#, 16#00#, 16#07#, 16#C0#, 16#00#, 16#00#, 16#00#, 16#00#, 16#7C#, 16#00#, 16#00#, 16#00#, 16#00#, 16#07#, 16#C0#, 16#00#, 16#00#, 16#00#, 16#00#, 16#7C#, 16#00#, 16#00#, 16#00#, 16#00#, 16#07#, 16#C0#, 16#00#, 16#00#, 16#00#, 16#00#, 16#7C#, 16#00#, 16#00#, 16#00#, 16#00#, 16#07#, 16#C0#, 16#00#, 16#00#, 16#00#, 16#00#, 16#7C#, 16#00#, 16#00#, 16#00#, 16#00#, 16#07#, 16#C0#, 16#00#, 16#00#, 16#00#, 16#00#, 16#7C#, 16#00#, 16#00#, 16#00#, 16#00#, 16#07#, 16#C0#, 16#00#, 16#00#, 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#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#F8#, 16#00#, 16#00#, 16#00#, 16#00#, 16#03#, 16#F0#, 16#00#, 16#00#, 16#00#, 16#00#, 16#0F#, 16#80#, 16#00#, 16#00#, 16#00#, 16#00#, 16#F8#, 16#00#, 16#00#, 16#00#, 16#00#, 16#0F#, 16#80#, 16#00#, 16#00#, 16#00#, 16#00#, 16#F8#, 16#00#, 16#00#, 16#00#, 16#00#, 16#0F#, 16#80#, 16#00#, 16#00#, 16#00#, 16#00#, 16#F8#, 16#00#, 16#00#, 16#00#, 16#00#, 16#1F#, 16#00#, 16#00#, 16#00#, 16#00#, 16#01#, 16#F0#, 16#00#, 16#00#, 16#00#, 16#00#, 16#1F#, 16#00#, 16#00#, 16#00#, 16#00#, 16#01#, 16#F0#, 16#00#, 16#00#, 16#00#, 16#00#, 16#3E#, 16#00#, 16#00#, 16#00#, 16#00#, 16#03#, 16#E0#, 16#00#, 16#00#, 16#00#, 16#00#, 16#3E#, 16#00#, 16#00#, 16#00#, 16#00#, 16#03#, 16#E0#, 16#00#, 16#00#, 16#00#, 16#00#, 16#7C#, 16#00#, 16#00#, 16#00#, 16#00#, 16#07#, 16#C0#, 16#00#, 16#00#, 16#00#, 16#00#, 16#3C#, 16#00#, 16#00#, 16#00#, 16#00#, 16#01#, 16#E0#, 16#00#, 16#00#, 16#00#, 16#00#, 16#03#, 16#80#, 16#00#, 16#00#, 16#00#, 16#03#, 16#E0#, 16#00#, 16#00#, 16#00#, 16#00#, 16#7C#, 16#00#, 16#00#, 16#00#, 16#00#, 16#0F#, 16#80#, 16#00#, 16#00#, 16#00#, 16#01#, 16#F0#, 16#00#, 16#00#, 16#00#, 16#00#, 16#1F#, 16#00#, 16#00#, 16#00#, 16#00#, 16#01#, 16#F0#, 16#00#, 16#00#, 16#00#, 16#00#, 16#3E#, 16#00#, 16#00#, 16#00#, 16#00#, 16#03#, 16#E0#, 16#00#, 16#00#, 16#00#, 16#00#, 16#3E#, 16#00#, 16#00#, 16#00#, 16#00#, 16#03#, 16#E0#, 16#00#, 16#00#, 16#00#, 16#00#, 16#7C#, 16#00#, 16#00#, 16#00#, 16#00#, 16#07#, 16#C0#, 16#00#, 16#00#, 16#00#, 16#00#, 16#7C#, 16#00#, 16#00#, 16#00#, 16#00#, 16#07#, 16#80#, 16#00#, 16#00#, 16#00#, 16#00#, 16#F8#, 16#00#, 16#00#, 16#00#, 16#00#, 16#0F#, 16#80#, 16#00#, 16#00#, 16#00#, 16#00#, 16#F0#, 16#00#, 16#00#, 16#00#, 16#00#, 16#0E#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#C0#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#03#, 16#E0#, 16#00#, 16#00#, 16#00#, 16#00#, 16#FF#, 16#C0#, 16#40#, 16#00#, 16#00#, 16#1F#, 16#FF#, 16#0E#, 16#00#, 16#00#, 16#01#, 16#FF#, 16#FF#, 16#F0#, 16#00#, 16#00#, 16#1C#, 16#1F#, 16#FE#, 16#00#, 16#00#, 16#00#, 16#00#, 16#7F#, 16#C0#, 16#00#, 16#00#, 16#00#, 16#00#, 16#F8#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 16#00#, 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 => 308, Glyph_Width => 44, Glyph_Height => 56, Data => FreeSerifBoldItalic24pt7bBitmaps'Access); Font : constant Bitmap_Font_Ref := Font_D'Access; end GESTE_Fonts.FreeSerifBoldItalic24pt7b;
zhmu/ananas
Ada
3,732
ads
------------------------------------------------------------------------------ -- -- -- GNAT COMPILER COMPONENTS -- -- -- -- S Y S T E M . A D D R E S S _ T O _ A C C E S S _ C O N V E R S I O N S -- -- -- -- S p e c -- -- -- -- Copyright (C) 1992-2022, Free Software Foundation, Inc. -- -- -- -- This specification is derived from the Ada Reference Manual for use with -- -- GNAT. The copyright notice above, and the license provisions that follow -- -- apply solely to the contents of the part following the private keyword. -- -- -- -- GNAT is free software; you can redistribute it and/or modify it under -- -- terms of the GNU General Public License as published by the Free Soft- -- -- ware Foundation; either version 3, or (at your option) any later ver- -- -- sion. GNAT is distributed in the hope that it will be useful, but WITH- -- -- OUT ANY WARRANTY; without even the implied warranty of MERCHANTABILITY -- -- or FITNESS FOR A PARTICULAR PURPOSE. -- -- -- -- As a special exception under Section 7 of GPL version 3, you are granted -- -- additional permissions described in the GCC Runtime Library Exception, -- -- version 3.1, as published by the Free Software Foundation. -- -- -- -- You should have received a copy of the GNU General Public License and -- -- a copy of the GCC Runtime Library Exception along with this program; -- -- see the files COPYING3 and COPYING.RUNTIME respectively. If not, see -- -- <http://www.gnu.org/licenses/>. -- -- -- -- GNAT was originally developed by the GNAT team at New York University. -- -- Extensive contributions were provided by Ada Core Technologies Inc. -- -- -- ------------------------------------------------------------------------------ generic type Object (<>) is limited private; package System.Address_To_Access_Conversions is pragma Preelaborate; pragma Compile_Time_Warning (Object'Unconstrained_Array, "Object is unconstrained array type" & ASCII.LF & "To_Pointer results may not have bounds"); type Object_Pointer is access all Object; for Object_Pointer'Size use Standard'Address_Size; pragma No_Strict_Aliasing (Object_Pointer); -- Strictly speaking, this routine should not be used to generate pointers -- to other than proper values of the proper type, but in practice, this -- is done all the time. This pragma stops the compiler from doing some -- optimizations that may cause unexpected results based on the assumption -- of no strict aliasing. function To_Pointer (Value : Address) return Object_Pointer; function To_Address (Value : Object_Pointer) return Address; pragma Import (Intrinsic, To_Pointer); pragma Import (Intrinsic, To_Address); end System.Address_To_Access_Conversions;
charlie5/aIDE
Ada
2,831
ads
with AdaM.subtype_Indication, AdaM.component_Definition, Ada.Streams; package AdaM.a_Type.array_type is type Item is new a_Type.composite_Type with private; type View is access all Item'Class; -- Forge -- function new_Type (Name : in String := "") return array_type.view; overriding procedure destruct (Self : in out Item); procedure free (Self : in out array_type.view); -- Attributes -- overriding function Id (Self : access Item) return AdaM.Id; overriding function to_Source (Self : in Item) return text_Vectors.Vector; function index_Indication (Self : access Item) return AdaM.subtype_Indication.view; function component_Indication (Self : access Item) return AdaM.subtype_Indication.view; -- function index_Type (Self : access Item) return access AdaM.a_Type.view; -- function index_Type (Self : in Item) return AdaM.a_Type.view; -- procedure index_Type_is (Self : in out Item; Now : in AdaM.a_Type.view); -- function element_Type (Self : access Item) return access AdaM.a_Type.view; -- function element_Type (Self : in Item) return AdaM.a_Type.view; -- procedure element_Type_is (Self : in out Item; Now : in AdaM.a_Type.view); -- -- function First (Self : in Item) return String; -- procedure First_is (Self : in out Item; Now : in String); -- -- function Last (Self : in Item) return String; -- procedure Last_is (Self : in out Item; Now : in String); function is_Constrained (Self : in Item) return Boolean; procedure is_Constrained (Self : in out Item; Now : in Boolean := True); function Component_is_aliased (Self : in Item) return Boolean; procedure Component_is_aliased (Self : in out Item; Now : in Boolean := True); private type Item is new a_Type.composite_Type with record -- index_Type : aliased AdaM.a_Type.view; -- element_Type : aliased AdaM.a_Type.view; index_Subtype : AdaM.subtype_Indication.view; Component : AdaM.component_Definition.view; -- element_Subtype : AdaM.subtype_Indication.view; -- Element_is_aliased : Boolean := False; is_Constrained : Boolean; First : Text; Last : Text; end record; -- Streams -- 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; end AdaM.a_Type.array_type;
albertklee/SPARKZumo
Ada
17,592
ads
pragma SPARK_Mode; with Line_Finder_Types; use Line_Finder_Types; -- @summary -- Graph filtering mechanism for discrete state filtering -- -- @description -- The package is responsible for window averaging a set of states to low-pass -- filter the change between states that the robot detects. -- -- Please don't edit anything in this file marked GENERATED! These are items -- that the project plugin generates during the compilation -- package Geo_Filter is -- The width of the averaging window Window_Size : constant := 5; -- This changed the size of the lookup table. Corresponds to half the -- width and half the height of the lookup graph Corner_Coord : constant := 15; -- GENERATED - The radii length of calculated noise Radii_Threshold : constant := 7; -- Corner_Coord / 3 * sqrt(2) subtype X_Coordinate is Integer range (-1) * Corner_Coord .. Corner_Coord; subtype Y_Coordinate is Integer range (-1) * Corner_Coord .. Corner_Coord; -- A point in the Lookup table -- @field X coordinate in the X horizontal axis -- @field Y coordiante in the Y vertical axis type Point_Type is record X : X_Coordinate; Y : Y_Coordinate; end record; -- Position of each point on the graph. This is the point inserted into -- the averaging window State2PointLookup : constant array (LineState) of Point_Type := (Lost => Point_Type'(X => (-1) * Corner_Coord, Y => (-1) * Corner_Coord), Online => Point_Type'(X => Corner_Coord, Y => Corner_Coord), BranchRight => Point_Type'(X => Corner_Coord, Y => 0), BranchLeft => Point_Type'(X => (-1) * Corner_Coord, Y => Corner_Coord), Fork => Point_Type'(X => Corner_Coord, Y => (-1) * Corner_Coord), Perp => Point_Type'(X => Corner_Coord, Y => 0), Unknown => Point_Type'(X => 0, Y => 0)); type Window_Type is array (1 .. Window_Size) of Point_Type; Window : Window_Type := (others => State2PointLookup (Online)); Window_Index : Integer range 1 .. Window_Size := Window_Type'First; -- This performs the filtering -- @param State pass the detected state here and received the computed -- state here -- @param Thresh whether or not the computed point is inside the threshold -- window defined by the constant Radii_Threshold procedure FilterState (State : in out LineState; Thresh : out Boolean) with Global => (In_Out => (Window, Window_Index)), Post => (if State'Old /= Unknown then Window_Index /= Window_Index'Old); private -- Computes the distance from the center of the graph to coordinate X, Y -- @param X the X value of the coordinate to compute -- @param Y the y value of the coordinate to compute -- @return True if the distance from the center of the graph to -- X, Y > Radii_Threshold function Radii_Length (X : Integer; Y : Integer) return Integer; type StateLookupTable is array (X_Coordinate'Range, Y_Coordinate'Range) of LineState; -- GENERATED - this is computed from the project plugin and is dependent -- on the Corner_Coord constant above AvgPoint2StateLookup : constant StateLookupTable := ((Unknown, Unknown, Unknown, Unknown, Unknown, Unknown, Unknown, Unknown, Unknown, Unknown, Unknown, Unknown, Unknown, Unknown, Unknown, Unknown, Unknown, Unknown, Unknown, Unknown, Unknown, Unknown, Unknown, Unknown, Unknown, Unknown, Unknown, Unknown, Unknown, Unknown, Unknown), (Unknown, Lost, Lost, Lost, Lost, Perp, Perp, Perp, Perp, Perp, Perp, Perp, Perp, Perp, Perp, Perp, Perp, Perp, Perp, Perp, Perp, Perp, Perp, Perp, Perp, Perp, BranchLeft, BranchLeft, BranchLeft, BranchLeft, Unknown), (Unknown, Lost, Lost, Lost, Lost, Lost, Perp, Perp, Perp, Perp, Perp, Perp, Perp, Perp, Perp, Perp, Perp, Perp, Perp, Perp, Perp, Perp, Perp, Perp, Perp, BranchLeft, BranchLeft, BranchLeft, BranchLeft, BranchLeft, Unknown), (Unknown, Lost, Lost, Lost, Lost, Lost, Lost, Perp, Perp, Perp, Perp, Perp, Perp, Perp, Perp, Perp, Perp, Perp, Perp, Perp, Perp, Perp, Perp, Perp, BranchLeft, BranchLeft, BranchLeft, BranchLeft, BranchLeft, BranchLeft, Unknown), (Unknown, Lost, Lost, Lost, Lost, Lost, Lost, Perp, Perp, Perp, Perp, Perp, Perp, Perp, Perp, Perp, Perp, Perp, Perp, Perp, Perp, Perp, Perp, Perp, BranchLeft, BranchLeft, BranchLeft, BranchLeft, BranchLeft, BranchLeft, Unknown), (Unknown, Lost, Lost, Lost, Lost, Lost, Lost, Lost, Perp, Perp, Perp, Perp, Perp, Perp, Perp, Perp, Perp, Perp, Perp, Perp, Perp, Perp, Perp, BranchLeft, BranchLeft, BranchLeft, BranchLeft, BranchLeft, BranchLeft, BranchLeft, Unknown), (Unknown, Lost, Lost, Lost, Lost, Lost, Lost, Lost, Lost, Perp, Perp, Perp, Perp, Perp, Perp, Perp, Perp, Perp, Perp, Perp, Perp, Perp, BranchLeft, BranchLeft, BranchLeft, BranchLeft, BranchLeft, BranchLeft, BranchLeft, BranchLeft, Unknown), (Unknown, Lost, Lost, Lost, Lost, Lost, Lost, Lost, Lost, Lost, Perp, Perp, Perp, Perp, Perp, Perp, Perp, Perp, Perp, Perp, Perp, BranchLeft, BranchLeft, BranchLeft, BranchLeft, BranchLeft, BranchLeft, BranchLeft, BranchLeft, BranchLeft, Unknown), (Unknown, Lost, Lost, Lost, Lost, Lost, Lost, Lost, Lost, Lost, Perp, Perp, Perp, Perp, Perp, Perp, Perp, Perp, Perp, Perp, Perp, BranchLeft, BranchLeft, BranchLeft, BranchLeft, BranchLeft, BranchLeft, BranchLeft, BranchLeft, BranchLeft, Unknown), (Unknown, Lost, Lost, Lost, Lost, Lost, Lost, Lost, Lost, Lost, Lost, Perp, Perp, Perp, Perp, Perp, Perp, Perp, Perp, Perp, BranchLeft, BranchLeft, BranchLeft, BranchLeft, BranchLeft, BranchLeft, BranchLeft, BranchLeft, BranchLeft, BranchLeft, Unknown), (Unknown, Lost, Lost, Lost, Lost, Lost, Lost, Lost, Lost, Lost, Lost, Lost, Perp, Perp, Perp, Perp, Perp, Perp, Perp, BranchLeft, BranchLeft, BranchLeft, BranchLeft, BranchLeft, BranchLeft, BranchLeft, BranchLeft, BranchLeft, BranchLeft, BranchLeft, Unknown), (Unknown, Lost, Lost, Lost, Lost, Lost, Lost, Lost, Lost, Lost, Lost, Lost, Lost, Perp, Perp, Perp, Perp, Perp, BranchLeft, BranchLeft, BranchLeft, BranchLeft, BranchLeft, BranchLeft, BranchLeft, BranchLeft, BranchLeft, BranchLeft, BranchLeft, BranchLeft, Unknown), (Unknown, Lost, Lost, Lost, Lost, Lost, Lost, Lost, Lost, Lost, Lost, Lost, Lost, Perp, Perp, Perp, Perp, Perp, BranchLeft, BranchLeft, BranchLeft, BranchLeft, BranchLeft, BranchLeft, BranchLeft, BranchLeft, BranchLeft, BranchLeft, BranchLeft, BranchLeft, Unknown), (Unknown, Lost, Lost, Lost, Lost, Lost, Lost, Lost, Lost, Lost, Lost, Lost, Lost, Lost, Perp, Perp, Perp, BranchLeft, BranchLeft, BranchLeft, BranchLeft, BranchLeft, BranchLeft, BranchLeft, BranchLeft, BranchLeft, BranchLeft, BranchLeft, BranchLeft, BranchLeft, Unknown), (Unknown, Lost, Lost, Lost, Lost, Lost, Lost, Lost, Lost, Lost, Lost, Lost, Lost, Lost, Lost, Perp, BranchLeft, BranchLeft, BranchLeft, BranchLeft, BranchLeft, BranchLeft, BranchLeft, BranchLeft, BranchLeft, BranchLeft, BranchLeft, BranchLeft, BranchLeft, BranchLeft, Unknown), (Unknown, Unknown, Unknown, Unknown, Unknown, Unknown, Unknown, Unknown, Unknown, Unknown, Unknown, Unknown, Unknown, Unknown, Unknown, Unknown, Unknown, Unknown, Unknown, Unknown, Unknown, Unknown, Unknown, Unknown, Unknown, Unknown, Unknown, Unknown, Unknown, Unknown, Unknown), (Unknown, Fork, Fork, Fork, Fork, Fork, Fork, Fork, Fork, Fork, Fork, Fork, Fork, Fork, Fork, BranchRight, Online, Online, Online, Online, Online, Online, Online, Online, Online, Online, Online, Online, Online, Online, Unknown), (Unknown, Fork, Fork, Fork, Fork, Fork, Fork, Fork, Fork, Fork, Fork, Fork, Fork, Fork, BranchRight, BranchRight, BranchRight, Online, Online, Online, Online, Online, Online, Online, Online, Online, Online, Online, Online, Online, Unknown), (Unknown, Fork, Fork, Fork, Fork, Fork, Fork, Fork, Fork, Fork, Fork, Fork, Fork, BranchRight, BranchRight, BranchRight, BranchRight, BranchRight, Online, Online, Online, Online, Online, Online, Online, Online, Online, Online, Online, Online, Unknown), (Unknown, Fork, Fork, Fork, Fork, Fork, Fork, Fork, Fork, Fork, Fork, Fork, Fork, BranchRight, BranchRight, BranchRight, BranchRight, BranchRight, Online, Online, Online, Online, Online, Online, Online, Online, Online, Online, Online, Online, Unknown), (Unknown, Fork, Fork, Fork, Fork, Fork, Fork, Fork, Fork, Fork, Fork, Fork, BranchRight, BranchRight, BranchRight, BranchRight, BranchRight, BranchRight, BranchRight, Online, Online, Online, Online, Online, Online, Online, Online, Online, Online, Online, Unknown), (Unknown, Fork, Fork, Fork, Fork, Fork, Fork, Fork, Fork, Fork, Fork, BranchRight, BranchRight, BranchRight, BranchRight, BranchRight, BranchRight, BranchRight, BranchRight, BranchRight, Online, Online, Online, Online, Online, Online, Online, Online, Online, Online, Unknown), (Unknown, Fork, Fork, Fork, Fork, Fork, Fork, Fork, Fork, Fork, BranchRight, BranchRight, BranchRight, BranchRight, BranchRight, BranchRight, BranchRight, BranchRight, BranchRight, BranchRight, BranchRight, Online, Online, Online, Online, Online, Online, Online, Online, Online, Unknown), (Unknown, Fork, Fork, Fork, Fork, Fork, Fork, Fork, Fork, Fork, BranchRight, BranchRight, BranchRight, BranchRight, BranchRight, BranchRight, BranchRight, BranchRight, BranchRight, BranchRight, BranchRight, Online, Online, Online, Online, Online, Online, Online, Online, Online, Unknown), (Unknown, Fork, Fork, Fork, Fork, Fork, Fork, Fork, Fork, BranchRight, BranchRight, BranchRight, BranchRight, BranchRight, BranchRight, BranchRight, BranchRight, BranchRight, BranchRight, BranchRight, BranchRight, BranchRight, Online, Online, Online, Online, Online, Online, Online, Online, Unknown), (Unknown, Fork, Fork, Fork, Fork, Fork, Fork, Fork, BranchRight, BranchRight, BranchRight, BranchRight, BranchRight, BranchRight, BranchRight, BranchRight, BranchRight, BranchRight, BranchRight, BranchRight, BranchRight, BranchRight, BranchRight, Online, Online, Online, Online, Online, Online, Online, Unknown), (Unknown, Fork, Fork, Fork, Fork, Fork, Fork, BranchRight, BranchRight, BranchRight, BranchRight, BranchRight, BranchRight, BranchRight, BranchRight, BranchRight, BranchRight, BranchRight, BranchRight, BranchRight, BranchRight, BranchRight, BranchRight, BranchRight, Online, Online, Online, Online, Online, Online, Unknown), (Unknown, Fork, Fork, Fork, Fork, Fork, Fork, BranchRight, BranchRight, BranchRight, BranchRight, BranchRight, BranchRight, BranchRight, BranchRight, BranchRight, BranchRight, BranchRight, BranchRight, BranchRight, BranchRight, BranchRight, BranchRight, BranchRight, Online, Online, Online, Online, Online, Online, Unknown), (Unknown, Fork, Fork, Fork, Fork, Fork, BranchRight, BranchRight, BranchRight, BranchRight, BranchRight, BranchRight, BranchRight, BranchRight, BranchRight, BranchRight, BranchRight, BranchRight, BranchRight, BranchRight, BranchRight, BranchRight, BranchRight, BranchRight, BranchRight, Online, Online, Online, Online, Online, Unknown), (Unknown, Fork, Fork, Fork, Fork, BranchRight, BranchRight, BranchRight, BranchRight, BranchRight, BranchRight, BranchRight, BranchRight, BranchRight, BranchRight, BranchRight, BranchRight, BranchRight, BranchRight, BranchRight, BranchRight, BranchRight, BranchRight, BranchRight, BranchRight, BranchRight, Online, Online, Online, Online, Unknown), (Unknown, Unknown, Unknown, Unknown, Unknown, Unknown, Unknown, Unknown, Unknown, Unknown, Unknown, Unknown, Unknown, Unknown, Unknown, Unknown, Unknown, Unknown, Unknown, Unknown, Unknown, Unknown, Unknown, Unknown, Unknown, Unknown, Unknown, Unknown, Unknown, Unknown, Unknown)); end Geo_Filter;
reznikmm/matreshka
Ada
2,435
ads
-- Root type for 9P messages with Ada.Streams; with Interfaces; with League.Strings; with League.Calendars; limited with Styx.Request_Visiters; limited with Styx.Reply_Visiters; package Styx.Messages is type Size is mod 2 ** 32; type Message_Tag is mod 2 ** 16; type Byte_Count is mod 2 ** 16; type FID is mod 2 ** 32; type QID is record Kind : Interfaces.Unsigned_8; Version : Interfaces.Unsigned_32; Path : Interfaces.Unsigned_64; end record; Directory : constant Interfaces.Unsigned_8 := 16#80#; -- type bit for directories Append_Only : constant Interfaces.Unsigned_8 := 16#40#; -- type bit for append only files Exclusive : constant Interfaces.Unsigned_8 := 16#20#; -- type bit for exclusive use files Mount : constant Interfaces.Unsigned_8 := 16#10#; -- type bit for mounted channel Authentication : constant Interfaces.Unsigned_8 := 16#08#; -- type bit for authentication file Temporary : constant Interfaces.Unsigned_8 := 16#04#; -- type bit for non-backed-up file Symbolic_Link : constant Interfaces.Unsigned_8 := 16#02#; -- type bit for symbolic link Link : constant Interfaces.Unsigned_8 := 16#01#; -- type bit for hard link Normal : constant Interfaces.Unsigned_8 := 16#00#; -- type bits for plain file type Directory_Entry is record Dir_Type : Interfaces.Unsigned_16; Dev : Interfaces.Unsigned_32; QID : Styx.Messages.QID; Mode : Interfaces.Unsigned_32; Access_Time : League.Calendars.Date_Time; Change_Time : League.Calendars.Date_Time; Length : Interfaces.Unsigned_64; Name : League.Strings.Universal_String; Owner : League.Strings.Universal_String; Group : League.Strings.Universal_String; Changed : League.Strings.Universal_String; end record; type Request is abstract tagged record Tag : Message_Tag; end record; procedure Visit (Visiter : in out Styx.Request_Visiters.Request_Visiter'Class; Value : Request) is abstract; type Request_Access is access all Request'Class; type Reply is abstract tagged record Tag : Message_Tag; end record; procedure Visit (Visiter : in out Styx.Reply_Visiters.Reply_Visiter'Class; Value : Reply) is abstract; end Styx.Messages;
MinimSecure/unum-sdk
Ada
818
adb
-- Copyright 2013-2019 Free Software Foundation, Inc. -- -- This program is free software; you can redistribute it and/or modify -- it under the terms of the GNU General Public License as published by -- the Free Software Foundation; either version 3 of the License, or -- (at your option) any later version. -- -- This program is distributed in the hope that it will be useful, -- but WITHOUT ANY WARRANTY; without even the implied warranty of -- MERCHANTABILITY or FITNESS FOR A PARTICULAR PURPOSE. See the -- GNU General Public License for more details. -- -- You should have received a copy of the GNU General Public License -- along with this program. If not, see <http://www.gnu.org/licenses/>. package body IO is procedure Put_Line (S : String) is begin null; end Put_Line; end IO;
reznikmm/matreshka
Ada
7,956
ads
------------------------------------------------------------------------------ -- -- -- Matreshka Project -- -- -- -- Localization, Internationalization, Globalization for Ada -- -- -- -- Runtime Library Component -- -- -- ------------------------------------------------------------------------------ -- -- -- Copyright © 2010-2013, Vadim Godunko <[email protected]> -- -- All rights reserved. -- -- -- -- Redistribution and use in source and binary forms, with or without -- -- modification, are permitted provided that the following conditions -- -- are met: -- -- -- -- * Redistributions of source code must retain the above copyright -- -- notice, this list of conditions and the following disclaimer. -- -- -- -- * Redistributions in binary form must reproduce the above copyright -- -- notice, this list of conditions and the following disclaimer in the -- -- documentation and/or other materials provided with the distribution. -- -- -- -- * Neither the name of the Vadim Godunko, IE nor the names of its -- -- contributors may be used to endorse or promote products derived from -- -- this software without specific prior written permission. -- -- -- -- THIS SOFTWARE IS PROVIDED BY THE COPYRIGHT HOLDERS AND CONTRIBUTORS -- -- "AS IS" AND ANY EXPRESS OR IMPLIED WARRANTIES, INCLUDING, BUT NOT -- -- LIMITED TO, THE IMPLIED WARRANTIES OF MERCHANTABILITY AND FITNESS FOR -- -- A PARTICULAR PURPOSE ARE DISCLAIMED. IN NO EVENT SHALL THE COPYRIGHT -- -- HOLDER OR CONTRIBUTORS BE LIABLE FOR ANY DIRECT, INDIRECT, INCIDENTAL, -- -- SPECIAL, EXEMPLARY, OR CONSEQUENTIAL DAMAGES (INCLUDING, BUT NOT LIMITED -- -- TO, PROCUREMENT OF SUBSTITUTE GOODS OR SERVICES; LOSS OF USE, DATA, OR -- -- PROFITS; OR BUSINESS INTERRUPTION) HOWEVER CAUSED AND ON ANY THEORY OF -- -- LIABILITY, WHETHER IN CONTRACT, STRICT LIABILITY, OR TORT (INCLUDING -- -- NEGLIGENCE OR OTHERWISE) ARISING IN ANY WAY OUT OF THE USE OF THIS -- -- SOFTWARE, EVEN IF ADVISED OF THE POSSIBILITY OF SUCH DAMAGE. -- -- -- ------------------------------------------------------------------------------ -- $Revision$ $Date$ ------------------------------------------------------------------------------ -- This package provides set of Intel's specific data types for MMX/SSE/AVX -- instruction sets. Children packages provide operations on this types, -- one child package covers one instruction set. Types declarations are -- specific for GNAT compiler. The way how subprograms are defined is also -- GNAT specific, it allows to highly optimize code and replace one function -- by one instruction in most cases. ------------------------------------------------------------------------------ with Ada.Unchecked_Conversion; with Interfaces; package Matreshka.SIMD.Intel is pragma Pure; -- 256-bit types type v32qi is array (1 .. 32) of Interfaces.Integer_8; for v32qi'Alignment use 32; pragma Machine_Attribute (v32qi, "vector_type"); pragma Machine_Attribute (v32qi, "may_alias"); type v16hi is array (1 .. 16) of Interfaces.Integer_16; for v16hi'Alignment use 32; pragma Machine_Attribute (v16hi, "vector_type"); pragma Machine_Attribute (v16hi, "may_alias"); type v8si is array (1 .. 8) of Interfaces.Integer_32; for v8si'Alignment use 32; pragma Machine_Attribute (v8si, "vector_type"); pragma Machine_Attribute (v8si, "may_alias"); type v4di is array (1 .. 4) of Interfaces.Integer_64; for v4di'Alignment use 32; pragma Machine_Attribute (v4di, "vector_type"); pragma Machine_Attribute (v4di, "may_alias"); type v8sf is array (1 .. 8) of Interfaces.IEEE_Float_32; for v8sf'Alignment use 32; pragma Machine_Attribute (v8sf, "vector_type"); pragma Machine_Attribute (v8sf, "may_alias"); type v4df is array (1 .. 4) of Interfaces.IEEE_Float_64; for v4df'Alignment use 32; pragma Machine_Attribute (v4df, "vector_type"); pragma Machine_Attribute (v4df, "may_alias"); -- 128-bit types type v16qi is array (1 .. 16) of Interfaces.Integer_8; for v16qi'Alignment use 16; pragma Machine_Attribute (v16qi, "vector_type"); pragma Machine_Attribute (v16qi, "may_alias"); type v8hi is array (1 .. 8) of Interfaces.Integer_16; for v8hi'Alignment use 16; pragma Machine_Attribute (v8hi, "vector_type"); pragma Machine_Attribute (v8hi, "may_alias"); type v4si is array (1 .. 4) of Interfaces.Integer_32; for v4si'Alignment use 16; pragma Machine_Attribute (v4si, "vector_type"); pragma Machine_Attribute (v4si, "may_alias"); type v2di is array (1 .. 2) of Interfaces.Integer_64; for v2di'Alignment use 16; pragma Machine_Attribute (v2di, "vector_type"); pragma Machine_Attribute (v2di, "may_alias"); type v4sf is array (1 .. 4) of Interfaces.IEEE_Float_32; for v4sf'Alignment use 16; pragma Machine_Attribute (v4sf, "vector_type"); pragma Machine_Attribute (v4sf, "may_alias"); type v2df is array (1 .. 2) of Interfaces.IEEE_Float_64; for v2df'Alignment use 16; pragma Machine_Attribute (v2df, "vector_type"); pragma Machine_Attribute (v2df, "may_alias"); -- 64-bit types type v8qi is array (1 .. 8) of Interfaces.Integer_8; for v8qi'Alignment use 8; pragma Machine_Attribute (v8qi, "vector_type"); pragma Machine_Attribute (v8qi, "may_alias"); type v4hi is array (1 .. 4) of Interfaces.Integer_16; for v4hi'Alignment use 8; pragma Machine_Attribute (v4hi, "vector_type"); pragma Machine_Attribute (v4hi, "may_alias"); type v2si is array (1 .. 2) of Interfaces.Integer_32; for v2si'Alignment use 8; pragma Machine_Attribute (v2si, "vector_type"); pragma Machine_Attribute (v2si, "may_alias"); type v1di is array (1 .. 1) of Interfaces.Integer_64; for v1di'Alignment use 8; pragma Machine_Attribute (v1di, "vector_type"); pragma Machine_Attribute (v1di, "may_alias"); -- Type conversion operations. function To_v16hi is new Ada.Unchecked_Conversion (v4df, v16hi); function To_v4df is new Ada.Unchecked_Conversion (v16hi, v4df); function To_v16qi is new Ada.Unchecked_Conversion (v8hi, v16qi); function To_v8hi is new Ada.Unchecked_Conversion (v4si, v8hi); function To_v8hi is new Ada.Unchecked_Conversion (v2di, v8hi); function To_v4si is new Ada.Unchecked_Conversion (v8hi, v4si); function To_v2di is new Ada.Unchecked_Conversion (v4si, v2di); function To_v2di is new Ada.Unchecked_Conversion (v8hi, v2di); function To_v8qi is new Ada.Unchecked_Conversion (v2si, v8qi); function To_v4hi is new Ada.Unchecked_Conversion (v8qi, v4hi); function To_v4hi is new Ada.Unchecked_Conversion (v2si, v4hi); function To_v2si is new Ada.Unchecked_Conversion (v4hi, v2si); function To_v2si is new Ada.Unchecked_Conversion (v8qi, v2si); end Matreshka.SIMD.Intel;
Fabien-Chouteau/GESTE
Ada
4,243
ads
with GESTE; with GESTE.Grid; pragma Style_Checks (Off); package Game_Assets.Level_3 is -- Level_3 Width : constant := 20; Height : constant := 15; Tile_Width : constant := 16; Tile_Height : constant := 16; -- Back package Back is Width : constant := 20; Height : constant := 20; Data : aliased GESTE.Grid.Grid_Data := (( 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0), ( 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0), ( 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0), ( 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0), ( 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0), ( 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0), ( 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0), ( 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0), ( 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0), ( 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0), ( 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0), ( 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0), ( 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0), ( 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0), ( 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0), ( 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0), ( 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0), ( 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0), ( 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0), ( 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0)) ; end Back; -- Mid package Mid is Width : constant := 20; Height : constant := 20; Data : aliased GESTE.Grid.Grid_Data := (( 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 89, 90, 90), ( 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 89, 90, 90), ( 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 89, 90, 90), ( 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 89, 90, 90), ( 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 89, 90, 90), ( 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 89, 90, 90), ( 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 89, 90, 90), ( 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 89, 90, 90), ( 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 89, 90, 90), ( 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 89, 90, 90), ( 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 89, 90, 90), ( 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 89, 90, 90), ( 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 89, 90, 90), ( 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 89, 90, 90), ( 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 89, 90, 90), ( 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 89, 90, 90), ( 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 89, 90, 90), ( 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 89, 90, 90), ( 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 89, 90, 90), ( 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 89, 90, 90)) ; end Mid; -- Front package Front is Width : constant := 20; Height : constant := 20; Data : aliased GESTE.Grid.Grid_Data := (( 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0), ( 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 106, 0, 0, 0), ( 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 107, 0, 0, 0), ( 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 107, 0, 0, 0), ( 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 107, 0, 0, 0), ( 0, 0, 0, 0, 0, 83, 0, 0, 0, 0, 0, 107, 0, 0, 0), ( 0, 0, 0, 0, 0, 84, 0, 0, 0, 0, 0, 107, 0, 0, 0), ( 0, 0, 0, 0, 0, 85, 0, 0, 0, 0, 0, 107, 0, 0, 0), ( 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 107, 0, 0, 0), ( 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 107, 0, 0, 0), ( 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 108, 0, 0, 0), ( 0, 109, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0), ( 0, 110, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0), ( 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0), ( 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 122, 0, 0, 0), ( 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0), ( 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0), ( 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 105, 0, 0, 0), ( 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0), ( 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0)) ; end Front; end Game_Assets.Level_3;
AdaCore/gpr
Ada
3,199
adb
-- -- Copyright (C) 2019-2023, AdaCore -- -- SPDX-License-Identifier: Apache-2.0 WITH LLVM-Exception -- package body GPR2.Project.Registry.Pack.Description is ----------------------------- -- Get_Package_Description -- ----------------------------- function Get_Package_Description (Key : Package_Id) return String is begin if Pack_Package_Description.Contains (Package_Description, Key) then return Pack_Package_Description.Element (Package_Description, Key); else return ""; end if; end Get_Package_Description; ---------- -- Hash -- ---------- function Hash (Key : Package_Id) return Hash_Type is (Ada.Strings.Hash (Image (Key))); ----------------------------- -- Set_Package_Description -- ----------------------------- procedure Set_Package_Description (Key : Package_Id; Description : String) is use Pack_Package_Description; C : constant Cursor := Find (Package_Description, Key); begin if C = No_Element then Insert (Package_Description, Key, Description); else Replace_Element (Package_Description, C, Description); end if; end Set_Package_Description; begin -- Binder Set_Package_Description (Binder, "This package specifies characteristics useful when invoking the binder " & "either directly via the gnat driver or when using GPRbuild."); -- Builder Set_Package_Description (Builder, "This package specifies the compilation options used when building an " & "executable or a library for a project. Most of the options should be " & "set in one of Compiler, Binder or Linker packages, but there are " & "some general options that should be defined in this package."); -- Clean Set_Package_Description (Clean, "This package specifies the options used when cleaning a project or a " & "project tree using the tools gnatclean or gprclean."); -- Compiler Set_Package_Description (Compiler, "This package specifies the compilation options used by the compiler " & "for each language."); -- Gnatls Set_Package_Description (Gnatls, "This package specifies the options to use when invoking gnatls via the " & "gnat driver."); -- Install Set_Package_Description (Install, "This package specifies the options used when installing a project with " & "gprinstall."); -- Linker Set_Package_Description (Linker, "This package specifies the options used by the linker."); -- Naming Set_Package_Description (Naming, "This package specifies the naming conventions that apply to the source " & "files in a project. In particular, these conventions are used to " & "automatically find all source files in the source directories, or " & "given a file name to find out its language for proper processing."); -- Remote Set_Package_Description (Remote, "This package is used by GPRbuild to describe how distributed " & "compilation should be done."); end GPR2.Project.Registry.Pack.Description;
zhmu/ananas
Ada
6,246
adb
------------------------------------------------------------------------------ -- -- -- GNAT RUN-TIME COMPONENTS -- -- -- -- S Y S T E M . P A C K _ 3 1 -- -- -- -- 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 System.Storage_Elements; with System.Unsigned_Types; package body System.Pack_31 is subtype Bit_Order is System.Bit_Order; Reverse_Bit_Order : constant Bit_Order := Bit_Order'Val (1 - Bit_Order'Pos (System.Default_Bit_Order)); subtype Ofs is System.Storage_Elements.Storage_Offset; subtype Uns is System.Unsigned_Types.Unsigned; subtype N07 is System.Unsigned_Types.Unsigned range 0 .. 7; use type System.Storage_Elements.Storage_Offset; use type System.Unsigned_Types.Unsigned; type Cluster is record E0, E1, E2, E3, E4, E5, E6, E7 : Bits_31; end record; for Cluster use record E0 at 0 range 0 * Bits .. 0 * Bits + Bits - 1; E1 at 0 range 1 * Bits .. 1 * Bits + Bits - 1; E2 at 0 range 2 * Bits .. 2 * Bits + Bits - 1; E3 at 0 range 3 * Bits .. 3 * Bits + Bits - 1; E4 at 0 range 4 * Bits .. 4 * Bits + Bits - 1; E5 at 0 range 5 * Bits .. 5 * Bits + Bits - 1; E6 at 0 range 6 * Bits .. 6 * Bits + Bits - 1; E7 at 0 range 7 * Bits .. 7 * Bits + Bits - 1; end record; for Cluster'Size use Bits * 8; for Cluster'Alignment use Integer'Min (Standard'Maximum_Alignment, 1 + 1 * Boolean'Pos (Bits mod 2 = 0) + 2 * Boolean'Pos (Bits mod 4 = 0)); -- Use maximum possible alignment, given the bit field size, since this -- will result in the most efficient code possible for the field. type Cluster_Ref is access Cluster; type Rev_Cluster is new Cluster with Bit_Order => Reverse_Bit_Order, Scalar_Storage_Order => Reverse_Bit_Order; type Rev_Cluster_Ref is access Rev_Cluster; ------------ -- Get_31 -- ------------ function Get_31 (Arr : System.Address; N : Natural; Rev_SSO : Boolean) return Bits_31 is A : constant System.Address := Arr + Bits * Ofs (Uns (N) / 8); C : Cluster_Ref with Address => A'Address, Import; RC : Rev_Cluster_Ref with Address => A'Address, Import; begin if Rev_SSO then case N07 (Uns (N) mod 8) is when 0 => return RC.E0; when 1 => return RC.E1; when 2 => return RC.E2; when 3 => return RC.E3; when 4 => return RC.E4; when 5 => return RC.E5; when 6 => return RC.E6; when 7 => return RC.E7; end case; else case N07 (Uns (N) mod 8) is when 0 => return C.E0; when 1 => return C.E1; when 2 => return C.E2; when 3 => return C.E3; when 4 => return C.E4; when 5 => return C.E5; when 6 => return C.E6; when 7 => return C.E7; end case; end if; end Get_31; ------------ -- Set_31 -- ------------ procedure Set_31 (Arr : System.Address; N : Natural; E : Bits_31; Rev_SSO : Boolean) is A : constant System.Address := Arr + Bits * Ofs (Uns (N) / 8); C : Cluster_Ref with Address => A'Address, Import; RC : Rev_Cluster_Ref with Address => A'Address, Import; begin if Rev_SSO then case N07 (Uns (N) mod 8) is when 0 => RC.E0 := E; when 1 => RC.E1 := E; when 2 => RC.E2 := E; when 3 => RC.E3 := E; when 4 => RC.E4 := E; when 5 => RC.E5 := E; when 6 => RC.E6 := E; when 7 => RC.E7 := E; end case; else case N07 (Uns (N) mod 8) is when 0 => C.E0 := E; when 1 => C.E1 := E; when 2 => C.E2 := E; when 3 => C.E3 := E; when 4 => C.E4 := E; when 5 => C.E5 := E; when 6 => C.E6 := E; when 7 => C.E7 := E; end case; end if; end Set_31; end System.Pack_31;
reznikmm/matreshka
Ada
4,067
ads
------------------------------------------------------------------------------ -- -- -- Matreshka Project -- -- -- -- Open Document Toolkit -- -- -- -- Runtime Library Component -- -- -- ------------------------------------------------------------------------------ -- -- -- Copyright © 2014, Vadim Godunko <[email protected]> -- -- All rights reserved. -- -- -- -- Redistribution and use in source and binary forms, with or without -- -- modification, are permitted provided that the following conditions -- -- are met: -- -- -- -- * Redistributions of source code must retain the above copyright -- -- notice, this list of conditions and the following disclaimer. -- -- -- -- * Redistributions in binary form must reproduce the above copyright -- -- notice, this list of conditions and the following disclaimer in the -- -- documentation and/or other materials provided with the distribution. -- -- -- -- * Neither the name of the Vadim Godunko, IE nor the names of its -- -- contributors may be used to endorse or promote products derived from -- -- this software without specific prior written permission. -- -- -- -- THIS SOFTWARE IS PROVIDED BY THE COPYRIGHT HOLDERS AND CONTRIBUTORS -- -- "AS IS" AND ANY EXPRESS OR IMPLIED WARRANTIES, INCLUDING, BUT NOT -- -- LIMITED TO, THE IMPLIED WARRANTIES OF MERCHANTABILITY AND FITNESS FOR -- -- A PARTICULAR PURPOSE ARE DISCLAIMED. IN NO EVENT SHALL THE COPYRIGHT -- -- HOLDER OR CONTRIBUTORS BE LIABLE FOR ANY DIRECT, INDIRECT, INCIDENTAL, -- -- SPECIAL, EXEMPLARY, OR CONSEQUENTIAL DAMAGES (INCLUDING, BUT NOT LIMITED -- -- TO, PROCUREMENT OF SUBSTITUTE GOODS OR SERVICES; LOSS OF USE, DATA, OR -- -- PROFITS; OR BUSINESS INTERRUPTION) HOWEVER CAUSED AND ON ANY THEORY OF -- -- LIABILITY, WHETHER IN CONTRACT, STRICT LIABILITY, OR TORT (INCLUDING -- -- NEGLIGENCE OR OTHERWISE) ARISING IN ANY WAY OUT OF THE USE OF THIS -- -- SOFTWARE, EVEN IF ADVISED OF THE POSSIBILITY OF SUCH DAMAGE. -- -- -- ------------------------------------------------------------------------------ -- $Revision$ $Date$ ------------------------------------------------------------------------------ with ODF.DOM.Style_Print_Orientation_Attributes; package Matreshka.ODF_Style.Print_Orientation_Attributes is type Style_Print_Orientation_Attribute_Node is new Matreshka.ODF_Style.Abstract_Style_Attribute_Node and ODF.DOM.Style_Print_Orientation_Attributes.ODF_Style_Print_Orientation_Attribute with null record; overriding function Create (Parameters : not null access Matreshka.DOM_Attributes.Attribute_L2_Parameters) return Style_Print_Orientation_Attribute_Node; overriding function Get_Local_Name (Self : not null access constant Style_Print_Orientation_Attribute_Node) return League.Strings.Universal_String; end Matreshka.ODF_Style.Print_Orientation_Attributes;
AdaCore/gpr
Ada
51
ads
package Src is Width : constant := 78; end Src;
reznikmm/matreshka
Ada
3,980
ads
------------------------------------------------------------------------------ -- -- -- Matreshka Project -- -- -- -- Ada Modeling Framework -- -- -- -- Runtime Library Component -- -- -- ------------------------------------------------------------------------------ -- -- -- Copyright © 2011, Vadim Godunko <[email protected]> -- -- All rights reserved. -- -- -- -- Redistribution and use in source and binary forms, with or without -- -- modification, are permitted provided that the following conditions -- -- are met: -- -- -- -- * Redistributions of source code must retain the above copyright -- -- notice, this list of conditions and the following disclaimer. -- -- -- -- * Redistributions in binary form must reproduce the above copyright -- -- notice, this list of conditions and the following disclaimer in the -- -- documentation and/or other materials provided with the distribution. -- -- -- -- * Neither the name of the Vadim Godunko, IE nor the names of its -- -- contributors may be used to endorse or promote products derived from -- -- this software without specific prior written permission. -- -- -- -- THIS SOFTWARE IS PROVIDED BY THE COPYRIGHT HOLDERS AND CONTRIBUTORS -- -- "AS IS" AND ANY EXPRESS OR IMPLIED WARRANTIES, INCLUDING, BUT NOT -- -- LIMITED TO, THE IMPLIED WARRANTIES OF MERCHANTABILITY AND FITNESS FOR -- -- A PARTICULAR PURPOSE ARE DISCLAIMED. IN NO EVENT SHALL THE COPYRIGHT -- -- HOLDER OR CONTRIBUTORS BE LIABLE FOR ANY DIRECT, INDIRECT, INCIDENTAL, -- -- SPECIAL, EXEMPLARY, OR CONSEQUENTIAL DAMAGES (INCLUDING, BUT NOT LIMITED -- -- TO, PROCUREMENT OF SUBSTITUTE GOODS OR SERVICES; LOSS OF USE, DATA, OR -- -- PROFITS; OR BUSINESS INTERRUPTION) HOWEVER CAUSED AND ON ANY THEORY OF -- -- LIABILITY, WHETHER IN CONTRACT, STRICT LIABILITY, OR TORT (INCLUDING -- -- NEGLIGENCE OR OTHERWISE) ARISING IN ANY WAY OUT OF THE USE OF THIS -- -- SOFTWARE, EVEN IF ADVISED OF THE POSSIBILITY OF SUCH DAMAGE. -- -- -- ------------------------------------------------------------------------------ -- $Revision$ $Date$ ------------------------------------------------------------------------------ with League.Strings; package AMF.Internals.Collections.Strings is pragma Preelaborate; type Shared_String_Collection is abstract new Shared_Collection with null record; type Shared_String_Collection_Access is access all Shared_String_Collection'Class; not overriding function Element (Self : not null access constant Shared_String_Collection; Index : Positive) return League.Strings.Universal_String is abstract; overriding function Element (Self : not null access constant Shared_String_Collection; Index : Positive) return League.Holders.Holder; end AMF.Internals.Collections.Strings;
riccardo-bernardini/eugen
Ada
10,691
ads
with Ada.Strings.Bounded; with Ada.Strings.Fixed; with Ada.Containers.Vectors; with Ada.Characters.Handling; use Ada.Characters.Handling; with Regexp_Readers.Generic_Readers; -- -- This package hierarchy provides resources to operate with the description -- of research projects (mostly EU-style, but it can be used in other -- contexts). -- -- The model for a project is the following -- -- * A project has -- * A name -- * A short name -- * A sequence of partners -- * A sequence of WPs -- * A risk lists -- -- * Every PARTNER has -- * Name, short name, ID, index -- * A description -- * A set of roles, every role hase -- * name, ID -- * descripiton -- * cost -- -- * Every WP has -- * Name, short name, ID, index, description -- * WP type (research, admin, ...) -- * A sequence of tasks -- * Computed attributes: -- - begin/end dates -- - partner effort -- - deliverables -- - milestones -- -- * Every task has -- * Name, short name, ID, index, description -- * A parent WP -- * A dependence list (task depends on...) -- * A sequence of activity periods. Every period has -- - begin/end date -- - intensity -- - partner effort, every effort has -- + partner ID -- + role -- + number of PM -- * A set of milestones -- * A set of deliverables -- -- * Every milestone has -- * Name, short name, description, ID, index -- * A parent task -- * A due date -- -- * Every deliverable has -- * Name, short name, description, ID, index -- * A parent task -- * A due date -- -- A few comments about the data involved -- -- * Name and short name: they are used to be included in the -- research proposal by using a special syntax (#{...} ruby-like or -- \R{...} LaTeX-like?) that uses as parameter entity attributes -- optionally decorated -- -- * The dates can be in two format: symbolic and absolute. The idea -- is that we want to allow for dates like "design.start + 3" to denote -- three months after the end of the design WP. However, when -- we need to create, say, a GANNT we need actual months that can be -- obtained by computing all the symbolic dates. -- -- * For every element we have at least two indexes: a "local" and -- a "full" one. For example, task T4.3 has "3" as a local index -- and "4.3" is the global one and "T4.3" is the "decorated" one. -- While local and full are not necessarily unique (4.3 can also -- be a deliverable or a milestone of WP4), the decorated is unique. -- -- IDs are "labels" for entities and have a hierarchical structure, like -- -- wp1.task2 -- A task of WP1 -- wp1.blue_print -- A deliverable of WP1 -- -- In the context of WP1 only task2 or blue_print are necessary. We will -- call the parts separated by "." basic IDs. -- -- Basic IDs are case insensitive and have the usual "Ada identifier syntax" -- (letters, numbers and underscores, begin with a letter, no double or -- final underscore allowed). We cannot use '-' (as it is allowed in XML) -- since we could want to use the IDs in expression and ambiguity -- could arise with subtraction. -- -- An attribute is an ID with a final ".attribute", for example -- -- wp1.task2.begin -- The begin date of task2 -- wp1.duration -- The overall duration of WP1 -- -- Date attributes can be used in expressions. Attributes can also be included -- in descriptions using a syntax like -- -- #command{wp1.task2.begin?option1=a, option2=b} -- -- where "command" is a specific command and it can be empty -- (that is, something like "#{wp1.name}" is allowed). The part after "?" -- is optional and it is used for fine control the attribute format; -- for example, -- -- #{dissemination.name?short} -- -- could be used to insert the "short name" of WP dissemination. -- We could consider the possibility of default attributes and options -- so that something like -- -- #{dissemination} -- -- is possible. The idea for the default is the following -- -- * Every "class" of entity (WP, task, deliverable, ...) has a default -- attribute. -- * Every attribute associated with an entity (e.g., name of a WP) -- has a default option list -- * The maps -- -- class -> attribute -- (class, attribute) -> option -- -- are part of the project attributes. -- -------------------------------------------------------------------- -- ** Parsers, writers, processors -- -- In order to read/write textual representations of the projects we will -- need parsers and writers. Most probably initially we will support only -- the YAML format since it is fairly easy to parse and to write by hand. -- In order to allow for new formats we will use a "plugin-like structure" -- -- A different matter is the production of external files with information -- taken from the project. For example, LaTeX sources with the WP description -- or a GANTT chart of the activities in SVG, PDF or TeX format. -- -- The part of code that takes care of such productions is called a -- _processor_. Initially most probably we will support two kinds of -- processors -- -- 1. Template-based, much in the spirit of AWS templates. If possible, -- we will try to use them out-of-the-box -- 2. Server-based: an external processor is launched with some parameters -- that include a local port that can be queried to get informations -- about the project. The queries have the format of an attribute -- query (options included) with the difference that an some special -- attributes are added, namely: -- - tasks -- - delivs -- - milestones -- - wps -- - and maybe others -- -- The new attributes can be used to query "all the ... of ...". For -- example, in order to get all the tasks of WP dissemination the -- processor can ask for -- -- dissemination.tasks -- -- The answer will include a space-separated list of the ids of the -- tasks. -- -- ---------------------------------------------------------------- -- ** Editing projects -- -- In editing projects we can add/remove -- - WP -- - tasks of a WP -- - deliverables -- - milestones -- - partners -- - roles in partners -- -- We can also change -- - descriptions -- - names -- - dates -- -- package EU_Projects is -- Is a bound of 10 billions enough? type Currency is delta 0.01 digits 12 range 0.0 .. 9_999_999_999.99; Max_ID_Length : constant Positive := 256; -- -- Function to check if X satisfies the syntax of IDs. Informally, an -- ID has a syntax similar to an Ada identifier with the following additions -- -- (1) "." can be used inside the identifier so that "foo.bar" is OK -- (2) An identifier cannot begin nor end with "_" or "." -- (3) "_" must always be followed by an alphanumeric char -- (4) "." must always be followed by a letter -- (5) At most one "." can be present -- function Is_Valid_ID (X : String) return Boolean is ( (X'Length = 0) or else ((X'Length <= Max_ID_Length) and then (Is_Letter (X (X'First)) and Is_Alphanumeric (X (X'Last))) and then (for all I in X'Range => (Is_Alphanumeric (X (I)) or else (X (I) = '_' and then Is_Alphanumeric (X (I + 1))) or else (X (I) = '.' and then Is_Letter (X (I + 1))))) and then (for all I in X'Range => (for all J in I + 1 .. X'Last => (if X (I) = '.' then X (J) /= '.')))) -- Note : in the condition above I+1 is always well defined since -- if X(X'Last) is alphanumeric, the last two tests are cutted -- away by the "or else" after Is_Alphanumeric (X (I)), otherwise -- if X(X'Last) is not alphanumeric, the "for all" will not checked -- at all because of the preceding "and then" ); package Bounded_Identifiers is new Ada.Strings.Bounded.Generic_Bounded_Length (Max_ID_Length); use Bounded_Identifiers; type Dotted_Identifier is new Bounded_Identifiers.Bounded_String with Dynamic_Predicate => Is_Valid_ID (To_String (Bounded_String (Dotted_Identifier))); -- A simple identifier is similar to a Dotted_Identifier, but it -- cannot have a dot subtype Simple_Identifier is Dotted_Identifier with Dynamic_Predicate => (for all Ch of To_String (Simple_Identifier) => Ch /= '.'); function Image (X : Dotted_Identifier) return String is (To_String (X)); function To_ID (X : String)return Dotted_Identifier is (To_Bounded_String (X)) with Pre => Is_Valid_ID (X); function Verbose_To_ID (X : String) return Dotted_Identifier; -- Like To_ID, but it prints some debug info. Useful for debugging. function Join (X, Y : Simple_Identifier) return Dotted_Identifier is (To_ID (To_String (X) & "." & To_String (Y))); function Join (X : Simple_Identifier; Y : String) return Dotted_Identifier is (Join (X, To_ID (Y))); package ID_Readers is new Regexp_Readers.Generic_Readers (Result_Type => Dotted_Identifier, Regexp => Regexp_Readers.Dotted_Identifier, Convert => To_ID); package ID_Vectors is new Ada.Containers.Vectors (Index_Type => Positive, Element_Type => Dotted_Identifier); subtype ID_List is ID_Vectors.Vector; function To_ID_List (Input : String; Separators : String := " ,") return ID_List; Bad_Identifier : exception; Bad_Input : exception; -- The result of function 'Image associated to discrete types has -- a space at the beginning. That space is quite annoying and needs -- to be trimmed. This function is here so that everyone can use it function Chop (X : String) return String is (Ada.Strings.Fixed.Trim (X, Ada.Strings.Both)); function Image (X : Integer) return String is (Chop (Integer'Image (X))); end EU_Projects;
aogrcs/StratoX
Ada
1,304
ads
-- Institution: Technische Universität München -- Department: Realtime Computer Systems (RCS) -- Project: StratoX -- -- Authors: Martin Becker ([email protected]) with Units; use Units; -- @summary -- Interface to use a buzzer/beeper. package Buzzer_Manager with SPARK_Mode is -- subtype T_Name is Character -- with Static_Predicate => T_Name in 'a' .. 'g'; -- c,d,e,f,g,a,b -- subtype T_Octave is Integer range 3 .. 8; -- type Tone_Type is record -- name : T_Name; -- octave : T_Octave; -- 3=small octave -- end record; -- -- A4 = 440Hz -- -- type Song_Type is array (Positive range <>) of Tone_Type; procedure Initialize; procedure Tick; -- call this periodically to manage the buzzer function Valid_Frequency (f : Frequency_Type) return Boolean is (f > 0.0 * Hertz); -- procedure Set_Tone (t : Tone_Type); -- -- function Tone_To_Frequency (tone : Tone_Type) return Frequency_Type; -- -- compute the frequency for the given tone name. -- -- Examples: -- -- a' => 400 procedure Beep (f : in Frequency_Type; Reps : Natural; Period : Time_Type; Length : in Time_Type); -- beep given number of times. If reps = 0, then infinite. private procedure Reconfigure_Buzzer; end Buzzer_Manager;
sparre/Command-Line-Parser-Generator
Ada
526
adb
with Ada.Text_IO; package body Good_Multiple_Optional_Parameters is procedure Run (Help : in Boolean := False; Name : in String := "Jacob"; Year : in Ada.Calendar.Year_Number := 2015) is use Ada.Calendar, Ada.Text_IO; begin Put_Line (" Run (Help => " & Boolean'Image (Help) & ","); Put_Line (" Name => """ & Name & ""","); Put_Line (" Year =>" & Year_Number'Image (Year) & ");"); end Run; end Good_Multiple_Optional_Parameters;
reznikmm/matreshka
Ada
5,059
adb
------------------------------------------------------------------------------ -- -- -- Matreshka Project -- -- -- -- Open Document Toolkit -- -- -- -- Runtime Library Component -- -- -- ------------------------------------------------------------------------------ -- -- -- Copyright © 2014, Vadim Godunko <[email protected]> -- -- All rights reserved. -- -- -- -- Redistribution and use in source and binary forms, with or without -- -- modification, are permitted provided that the following conditions -- -- are met: -- -- -- -- * Redistributions of source code must retain the above copyright -- -- notice, this list of conditions and the following disclaimer. -- -- -- -- * Redistributions in binary form must reproduce the above copyright -- -- notice, this list of conditions and the following disclaimer in the -- -- documentation and/or other materials provided with the distribution. -- -- -- -- * Neither the name of the Vadim Godunko, IE nor the names of its -- -- contributors may be used to endorse or promote products derived from -- -- this software without specific prior written permission. -- -- -- -- THIS SOFTWARE IS PROVIDED BY THE COPYRIGHT HOLDERS AND CONTRIBUTORS -- -- "AS IS" AND ANY EXPRESS OR IMPLIED WARRANTIES, INCLUDING, BUT NOT -- -- LIMITED TO, THE IMPLIED WARRANTIES OF MERCHANTABILITY AND FITNESS FOR -- -- A PARTICULAR PURPOSE ARE DISCLAIMED. IN NO EVENT SHALL THE COPYRIGHT -- -- HOLDER OR CONTRIBUTORS BE LIABLE FOR ANY DIRECT, INDIRECT, INCIDENTAL, -- -- SPECIAL, EXEMPLARY, OR CONSEQUENTIAL DAMAGES (INCLUDING, BUT NOT LIMITED -- -- TO, PROCUREMENT OF SUBSTITUTE GOODS OR SERVICES; LOSS OF USE, DATA, OR -- -- PROFITS; OR BUSINESS INTERRUPTION) HOWEVER CAUSED AND ON ANY THEORY OF -- -- LIABILITY, WHETHER IN CONTRACT, STRICT LIABILITY, OR TORT (INCLUDING -- -- NEGLIGENCE OR OTHERWISE) ARISING IN ANY WAY OUT OF THE USE OF THIS -- -- SOFTWARE, EVEN IF ADVISED OF THE POSSIBILITY OF SUCH DAMAGE. -- -- -- ------------------------------------------------------------------------------ -- $Revision$ $Date$ ------------------------------------------------------------------------------ with Matreshka.ODF_String_Constants; package body Matreshka.ODF_DB is ------------------ -- Constructors -- ------------------ package body Constructors is ---------------- -- Initialize -- ---------------- procedure Initialize (Self : not null access Abstract_DB_Attribute_Node'Class; Document : not null Matreshka.DOM_Nodes.Document_Access; Prefix : League.Strings.Universal_String) is begin Matreshka.DOM_Attributes.Constructors.Initialize (Self, Document); Self.Prefix := Prefix; end Initialize; ---------------- -- Initialize -- ---------------- procedure Initialize (Self : not null access Abstract_DB_Element_Node'Class; Document : not null Matreshka.DOM_Nodes.Document_Access; Prefix : League.Strings.Universal_String) is begin Matreshka.DOM_Elements.Constructors.Initialize (Self, Document); Self.Prefix := Prefix; end Initialize; end Constructors; ----------------------- -- Get_Namespace_URI -- ----------------------- overriding function Get_Namespace_URI (Self : not null access constant Abstract_DB_Attribute_Node) return League.Strings.Universal_String is begin return Matreshka.ODF_String_Constants.DB_URI; end Get_Namespace_URI; ----------------------- -- Get_Namespace_URI -- ----------------------- overriding function Get_Namespace_URI (Self : not null access constant Abstract_DB_Element_Node) return League.Strings.Universal_String is begin return Matreshka.ODF_String_Constants.DB_URI; end Get_Namespace_URI; end Matreshka.ODF_DB;
reznikmm/matreshka
Ada
3,606
ads
------------------------------------------------------------------------------ -- -- -- Matreshka Project -- -- -- -- Ada Modeling Framework -- -- -- -- Runtime Library Component -- -- -- ------------------------------------------------------------------------------ -- -- -- Copyright © 2011-2012, Vadim Godunko <[email protected]> -- -- All rights reserved. -- -- -- -- Redistribution and use in source and binary forms, with or without -- -- modification, are permitted provided that the following conditions -- -- are met: -- -- -- -- * Redistributions of source code must retain the above copyright -- -- notice, this list of conditions and the following disclaimer. -- -- -- -- * Redistributions in binary form must reproduce the above copyright -- -- notice, this list of conditions and the following disclaimer in the -- -- documentation and/or other materials provided with the distribution. -- -- -- -- * Neither the name of the Vadim Godunko, IE nor the names of its -- -- contributors may be used to endorse or promote products derived from -- -- this software without specific prior written permission. -- -- -- -- THIS SOFTWARE IS PROVIDED BY THE COPYRIGHT HOLDERS AND CONTRIBUTORS -- -- "AS IS" AND ANY EXPRESS OR IMPLIED WARRANTIES, INCLUDING, BUT NOT -- -- LIMITED TO, THE IMPLIED WARRANTIES OF MERCHANTABILITY AND FITNESS FOR -- -- A PARTICULAR PURPOSE ARE DISCLAIMED. IN NO EVENT SHALL THE COPYRIGHT -- -- HOLDER OR CONTRIBUTORS BE LIABLE FOR ANY DIRECT, INDIRECT, INCIDENTAL, -- -- SPECIAL, EXEMPLARY, OR CONSEQUENTIAL DAMAGES (INCLUDING, BUT NOT LIMITED -- -- TO, PROCUREMENT OF SUBSTITUTE GOODS OR SERVICES; LOSS OF USE, DATA, OR -- -- PROFITS; OR BUSINESS INTERRUPTION) HOWEVER CAUSED AND ON ANY THEORY OF -- -- LIABILITY, WHETHER IN CONTRACT, STRICT LIABILITY, OR TORT (INCLUDING -- -- NEGLIGENCE OR OTHERWISE) ARISING IN ANY WAY OUT OF THE USE OF THIS -- -- SOFTWARE, EVEN IF ADVISED OF THE POSSIBILITY OF SUCH DAMAGE. -- -- -- ------------------------------------------------------------------------------ -- $Revision$ $Date$ ------------------------------------------------------------------------------ -- This file is generated, don't edit it. ------------------------------------------------------------------------------ with AMF.Elements.Generic_Hash; function AMF.UML.Merge_Nodes.Hash is new AMF.Elements.Generic_Hash (UML_Merge_Node, UML_Merge_Node_Access);
bemafred/hello-world
Ada
113
adb
with Ada.Text_IO; use Ada.Text_IO; procedure Hello is begin Put_Line ("ADA says: Hello, world!"); end Hello;
thierr26/ada-keystore
Ada
3,573
adb
----------------------------------------------------------------------- -- akt-main -- Ada Keystore Tool main procedure -- Copyright (C) 2019 Stephane Carrez -- Written by Stephane Carrez ([email protected]) -- -- Licensed under the Apache License, Version 2.0 (the "License"); -- you may not use this file except in compliance with the License. -- You may obtain a copy of the License at -- -- http://www.apache.org/licenses/LICENSE-2.0 -- -- Unless required by applicable law or agreed to in writing, software -- distributed under the License is distributed on an "AS IS" BASIS, -- WITHOUT WARRANTIES OR CONDITIONS OF ANY KIND, either express or implied. -- See the License for the specific language governing permissions and -- limitations under the License. ----------------------------------------------------------------------- with Ada.Command_Line; with Ada.IO_Exceptions; with Ada.Exceptions; with GNAT.Command_Line; with Util.Log.Loggers; with Util.Commands; with AKT.Commands; with Keystore; procedure AKT.Main is Log : constant Util.Log.Loggers.Logger := Util.Log.Loggers.Create ("AKT.Main"); Context : AKT.Commands.Context_Type; Arguments : Util.Commands.Dynamic_Argument_List; begin AKT.Configure_Logs (Debug => False, Dump => False, Verbose => False); AKT.Commands.Parse (Context, Arguments); exception when GNAT.Command_Line.Exit_From_Command_Line | GNAT.Command_Line.Invalid_Switch => Ada.Command_Line.Set_Exit_Status (Ada.Command_Line.Failure); when No_Keystore_File => Log.Error (-("Missing the keystore file name")); Ada.Command_Line.Set_Exit_Status (Ada.Command_Line.Failure); when Keystore.Bad_Password => Log.Error (-("Invalid password to unlock the keystore file")); Ada.Command_Line.Set_Exit_Status (Ada.Command_Line.Failure); when Keystore.No_Key_Slot => Log.Error (-("There is no available key slot to add the password")); Ada.Command_Line.Set_Exit_Status (Ada.Command_Line.Failure); when Keystore.No_Content => Log.Error (-("No content for an item of type wallet")); Ada.Command_Line.Set_Exit_Status (Ada.Command_Line.Failure); when Keystore.Corrupted => Log.Error (-("The keystore file is corrupted: invalid meta data content")); Ada.Command_Line.Set_Exit_Status (Ada.Command_Line.Failure); when Keystore.Invalid_Block => Log.Error (-("The keystore file is corrupted: invalid data block headers or signature")); Ada.Command_Line.Set_Exit_Status (Ada.Command_Line.Failure); when Keystore.Invalid_Signature => Log.Error (-("The keystore file is corrupted: invalid signature")); Ada.Command_Line.Set_Exit_Status (Ada.Command_Line.Failure); when Keystore.Invalid_Storage => Log.Error (-("The keystore file is corrupted: invalid or missing storage file")); Ada.Command_Line.Set_Exit_Status (Ada.Command_Line.Failure); when Keystore.Invalid_Keystore => Log.Error (-("The file is not a keystore")); Ada.Command_Line.Set_Exit_Status (Ada.Command_Line.Failure); when AKT.Commands.Error | Util.Commands.Not_Found => Ada.Command_Line.Set_Exit_Status (Ada.Command_Line.Failure); when E : Ada.IO_Exceptions.Name_Error => Log.Error (-("Cannot access file: {0}"), Ada.Exceptions.Exception_Message (E)); Ada.Command_Line.Set_Exit_Status (Ada.Command_Line.Failure); when E : others => Log.Error (-("Some internal error occurred"), E); Ada.Command_Line.Set_Exit_Status (Ada.Command_Line.Failure); end AKT.Main;
reznikmm/matreshka
Ada
6,901
adb
------------------------------------------------------------------------------ -- -- -- Matreshka Project -- -- -- -- Open Document Toolkit -- -- -- -- Runtime Library Component -- -- -- ------------------------------------------------------------------------------ -- -- -- Copyright © 2014, Vadim Godunko <[email protected]> -- -- All rights reserved. -- -- -- -- Redistribution and use in source and binary forms, with or without -- -- modification, are permitted provided that the following conditions -- -- are met: -- -- -- -- * Redistributions of source code must retain the above copyright -- -- notice, this list of conditions and the following disclaimer. -- -- -- -- * Redistributions in binary form must reproduce the above copyright -- -- notice, this list of conditions and the following disclaimer in the -- -- documentation and/or other materials provided with the distribution. -- -- -- -- * Neither the name of the Vadim Godunko, IE nor the names of its -- -- contributors may be used to endorse or promote products derived from -- -- this software without specific prior written permission. -- -- -- -- THIS SOFTWARE IS PROVIDED BY THE COPYRIGHT HOLDERS AND CONTRIBUTORS -- -- "AS IS" AND ANY EXPRESS OR IMPLIED WARRANTIES, INCLUDING, BUT NOT -- -- LIMITED TO, THE IMPLIED WARRANTIES OF MERCHANTABILITY AND FITNESS FOR -- -- A PARTICULAR PURPOSE ARE DISCLAIMED. IN NO EVENT SHALL THE COPYRIGHT -- -- HOLDER OR CONTRIBUTORS BE LIABLE FOR ANY DIRECT, INDIRECT, INCIDENTAL, -- -- SPECIAL, EXEMPLARY, OR CONSEQUENTIAL DAMAGES (INCLUDING, BUT NOT LIMITED -- -- TO, PROCUREMENT OF SUBSTITUTE GOODS OR SERVICES; LOSS OF USE, DATA, OR -- -- PROFITS; OR BUSINESS INTERRUPTION) HOWEVER CAUSED AND ON ANY THEORY OF -- -- LIABILITY, WHETHER IN CONTRACT, STRICT LIABILITY, OR TORT (INCLUDING -- -- NEGLIGENCE OR OTHERWISE) ARISING IN ANY WAY OUT OF THE USE OF THIS -- -- SOFTWARE, EVEN IF ADVISED OF THE POSSIBILITY OF SUCH DAMAGE. -- -- -- ------------------------------------------------------------------------------ -- $Revision$ $Date$ ------------------------------------------------------------------------------ with Matreshka.DOM_Documents; with Matreshka.ODF_String_Constants; with ODF.DOM.Iterators; with ODF.DOM.Visitors; package body Matreshka.ODF_Style.Region_Left_Elements is ------------ -- Create -- ------------ overriding function Create (Parameters : not null access Matreshka.DOM_Elements.Element_L2_Parameters) return Style_Region_Left_Element_Node is begin return Self : Style_Region_Left_Element_Node do Matreshka.ODF_Style.Constructors.Initialize (Self'Unchecked_Access, Parameters.Document, Matreshka.ODF_String_Constants.Style_Prefix); end return; end Create; ---------------- -- Enter_Node -- ---------------- overriding procedure Enter_Node (Self : not null access Style_Region_Left_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_Style_Region_Left (ODF.DOM.Style_Region_Left_Elements.ODF_Style_Region_Left_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 Style_Region_Left_Element_Node) return League.Strings.Universal_String is pragma Unreferenced (Self); begin return Matreshka.ODF_String_Constants.Region_Left_Element; end Get_Local_Name; ---------------- -- Leave_Node -- ---------------- overriding procedure Leave_Node (Self : not null access Style_Region_Left_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_Style_Region_Left (ODF.DOM.Style_Region_Left_Elements.ODF_Style_Region_Left_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 Style_Region_Left_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_Style_Region_Left (Visitor, ODF.DOM.Style_Region_Left_Elements.ODF_Style_Region_Left_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.Style_URI, Matreshka.ODF_String_Constants.Region_Left_Element, Style_Region_Left_Element_Node'Tag); end Matreshka.ODF_Style.Region_Left_Elements;
reznikmm/matreshka
Ada
4,538
adb
------------------------------------------------------------------------------ -- -- -- Matreshka Project -- -- -- -- Localization, Internationalization, Globalization for Ada -- -- -- -- 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.Internals.Locales.Defaults; package body League.Locales is ------------ -- Adjust -- ------------ overriding procedure Adjust (Self : in out Locale) is begin Matreshka.Internals.Locales.Reference (Self.Data); end Adjust; -------------- -- Finalize -- -------------- overriding procedure Finalize (Self : in out Locale) is use type Matreshka.Internals.Locales.Locale_Data_Access; begin if Self.Data /= null then Matreshka.Internals.Locales.Dereference (Self.Data); end if; end Finalize; ---------------- -- Initialize -- ---------------- overriding procedure Initialize (Self : in out Locale) is begin -- Set locale data. It is not initialized by default to avoid dependency -- from large generated data packages. Self.Data := Matreshka.Internals.Locales.Defaults.Default_Locale'Access; Matreshka.Internals.Locales.Reference (Self.Data); end Initialize; ----------------------- -- Set_Thread_Locale -- ----------------------- procedure Set_Thread_Locale (Self : Locale'Class) is begin null; end Set_Thread_Locale; end League.Locales;
AdaCore/Ada_Drivers_Library
Ada
4,266
ads
------------------------------------------------------------------------------ -- -- -- Copyright (C) 2017-2020, AdaCore -- -- -- -- Redistribution and use in source and binary forms, with or without -- -- modification, are permitted provided that the following conditions are -- -- met: -- -- 1. Redistributions of source code must retain the above copyright -- -- notice, this list of conditions and the following disclaimer. -- -- 2. Redistributions in binary form must reproduce the above copyright -- -- notice, this list of conditions and the following disclaimer in -- -- the documentation and/or other materials provided with the -- -- distribution. -- -- 3. Neither the name of the copyright holder nor the names of its -- -- contributors may be used to endorse or promote products derived -- -- from this software without specific prior written permission. -- -- -- -- THIS SOFTWARE IS PROVIDED BY THE COPYRIGHT HOLDERS AND CONTRIBUTORS -- -- "AS IS" AND ANY EXPRESS OR IMPLIED WARRANTIES, INCLUDING, BUT NOT -- -- LIMITED TO, THE IMPLIED WARRANTIES OF MERCHANTABILITY AND FITNESS FOR -- -- A PARTICULAR PURPOSE ARE DISCLAIMED. IN NO EVENT SHALL THE COPYRIGHT -- -- HOLDER OR CONTRIBUTORS BE LIABLE FOR ANY DIRECT, INDIRECT, INCIDENTAL, -- -- SPECIAL, EXEMPLARY, OR CONSEQUENTIAL DAMAGES (INCLUDING, BUT NOT -- -- LIMITED TO, PROCUREMENT OF SUBSTITUTE GOODS OR SERVICES; LOSS OF USE, -- -- DATA, OR PROFITS; OR BUSINESS INTERRUPTION) HOWEVER CAUSED AND ON ANY -- -- THEORY OF LIABILITY, WHETHER IN CONTRACT, STRICT LIABILITY, OR TORT -- -- (INCLUDING NEGLIGENCE OR OTHERWISE) ARISING IN ANY WAY OUT OF THE USE -- -- OF THIS SOFTWARE, EVEN IF ADVISED OF THE POSSIBILITY OF SUCH DAMAGE. -- -- -- ------------------------------------------------------------------------------ with nRF.Device; use nRF.Device; with nRF.GPIO; use nRF.GPIO; package NRF52_DK.IOs is type Pin_Id is range 0 .. 31; type IO_Features is (Digital, Analog); function Supports (Pin : Pin_Id; Feature : IO_Features) return Boolean is (case Feature is when Digital => (case Pin is when 0 .. 2 | 5 .. 27 => True, when others => False), when Analog => (case Pin is when 3 .. 4 | 28 .. 31 => True, when others => False)); procedure Set (Pin : Pin_Id; Value : Boolean) with Pre => Supports (Pin, Digital); function Set (Pin : Pin_Id) return Boolean with Pre => Supports (Pin, Digital); type Analog_Value is range 0 .. 4095; procedure Set_Analog_Period_Us (Period : Natural); -- Set the period (in microseconds) of the PWM signal for all analog output -- pins. procedure Write (Pin : Pin_Id; Value : Analog_Value) with Pre => Supports (Pin, Analog); function Analog (Pin : Pin_Id) return Analog_Value with Pre => Supports (Pin, Analog); -- Read the voltagle applied to the pin. 0 means 0V 1023 means 3.3V private -- Mapping between pin id and GPIO_Points Points : array (Pin_Id) of GPIO_Point := (0 => P00, 1 => P01, 2 => P02, 3 => P03, 4 => P04, 5 => P05, 6 => P06, 7 => P07, 8 => P08, 9 => P09, 10 => P10, 11 => P11, 12 => P12, 13 => P13, 14 => P14, 15 => P15, 16 => P16, 17 => P17, 18 => P18, 19 => P19, 20 => P20, 21 => P21, 22 => P22, 23 => P23, 24 => P24, 25 => P25, 26 => P26, 27 => P27, 28 => P28, 29 => P29, 30 => P30, 31 => P31 ); end NRF52_DK.IOs;
sungyeon/drake
Ada
1,651
ads
pragma License (Unrestricted); -- extended unit specialized for POSIX (Darwin, FreeBSD, or Linux) with Ada.IO_Exceptions; private with Ada.Finalization; private with C; package System.Program.Dynamic_Linking is -- Loading dynamic-link library. pragma Preelaborate; type Library is limited private; -- subtype Open_Library is Library -- with -- Dynamic_Predicate => Is_Open (Open_Library), -- Predicate_Failure => raise Status_Error; function Is_Open (Lib : Library) return Boolean; pragma Inline (Is_Open); procedure Open (Lib : in out Library; Name : String); function Open (Name : String) return Library; procedure Close (Lib : in out Library); function Import ( Lib : Library; -- Open_Library Symbol : String) return Address; Status_Error : exception renames Ada.IO_Exceptions.Status_Error; Name_Error : exception renames Ada.IO_Exceptions.Name_Error; Use_Error : exception renames Ada.IO_Exceptions.Use_Error; Data_Error : exception renames Ada.IO_Exceptions.Data_Error; private package Controlled is type Library is limited private; function Reference (Lib : Dynamic_Linking.Library) return not null access C.void_ptr; pragma Inline (Reference); private type Library is limited new Ada.Finalization.Limited_Controlled with record Handle : aliased C.void_ptr := C.void_ptr (Null_Address); end record; overriding procedure Finalize (Object : in out Library); end Controlled; type Library is new Controlled.Library; end System.Program.Dynamic_Linking;
rnnalborodo/shared_resources
Ada
3,089
adb
-- Solución sin vivacidad para el problema de los lectores/escritores -- Adapación a Ada 95 : Jaime Ramírez. -- En esta solución se puede observar muy bien la inanición de las tareas -- escritoras -- with Ada.Text_IO; -- use Ada.Text_IO; with Conc_IO; use Conc_IO; procedure Lectores_Escritores_Seg is Pausa : constant Duration := 5.0; Num_Lectores : constant Positive := 3; Numescritores : constant Positive := 3; subtype Tipo_Identidad_Lector is Positive range 1 .. Num_Lectores; subtype Tipo_Identidad_Escritor is Positive range 1 .. Numescritores; -- Código del gestor protected type Tipo_Gestor is entry Comenzar_Lectura; entry Comenzar_Escritura; entry Terminar_Lectura; entry Terminar_Escritura; private Num_Lectores : Natural := 0; Escribiendo : Boolean := False; end Tipo_Gestor; protected body Tipo_Gestor is entry Comenzar_Lectura when not Escribiendo is begin Num_Lectores := Num_Lectores + 1; end Comenzar_Lectura; entry Comenzar_Escritura when Num_Lectores = 0 and not Escribiendo is begin Escribiendo := True; end Comenzar_Escritura; entry Terminar_Lectura when True is begin Num_Lectores := Num_Lectores - 1; end Terminar_Lectura; entry Terminar_Escritura when True is begin Escribiendo := False; end Terminar_Escritura; end Tipo_Gestor; Gestor : Tipo_Gestor; -- Código de las tareas task type Lector (Ident : Tipo_Identidad_Lector := 1); task body Lector is begin loop Put_Line ("Lector "&Tipo_Identidad_Lector'Image (Ident)& " quiere leer"); Gestor.Comenzar_Lectura; Put_Line ("Lector "&Tipo_Identidad_Lector'Image (Ident)& " lee"); delay Pausa; Gestor.Terminar_Lectura; Put_Line ("Lector "&Tipo_Identidad_Lector'Image (Ident)& " termina de leer"); end loop; end Lector; task type Escritor (Ident : Tipo_Identidad_Escritor := 1); task body Escritor is begin loop Put_Line ("Escritor "&Tipo_Identidad_Escritor'Image (Ident)& " quiere escribir"); Gestor.Comenzar_Escritura; Put_Line ("Escritor "&Tipo_Identidad_Escritor'Image (Ident)& " escribe"); delay Pausa; Gestor.Terminar_Escritura; Put_Line ("Escritor "&Tipo_Identidad_Escritor'Image (Ident)& " termina de escribir"); end loop; end Escritor; -- Lectores : array (Tipo_Identidad_Lector) of Lector; -- Escritores : array (Tipo_Identidad_Escritor) of Escritor; Lector1 : Lector (1); Lector2 : Lector (2); Lector3 : Lector (3); Escritor1 : Escritor (1); Escritor2 : Escritor (2); Escritor3 : Escritor (3); begin null; end Lectores_Escritores_Seg;
reznikmm/matreshka
Ada
4,727
adb
------------------------------------------------------------------------------ -- -- -- Matreshka Project -- -- -- -- Open Document Toolkit -- -- -- -- Runtime Library Component -- -- -- ------------------------------------------------------------------------------ -- -- -- Copyright © 2014, Vadim Godunko <[email protected]> -- -- All rights reserved. -- -- -- -- Redistribution and use in source and binary forms, with or without -- -- modification, are permitted provided that the following conditions -- -- are met: -- -- -- -- * Redistributions of source code must retain the above copyright -- -- notice, this list of conditions and the following disclaimer. -- -- -- -- * Redistributions in binary form must reproduce the above copyright -- -- notice, this list of conditions and the following disclaimer in the -- -- documentation and/or other materials provided with the distribution. -- -- -- -- * Neither the name of the Vadim Godunko, IE nor the names of its -- -- contributors may be used to endorse or promote products derived from -- -- this software without specific prior written permission. -- -- -- -- THIS SOFTWARE IS PROVIDED BY THE COPYRIGHT HOLDERS AND CONTRIBUTORS -- -- "AS IS" AND ANY EXPRESS OR IMPLIED WARRANTIES, INCLUDING, BUT NOT -- -- LIMITED TO, THE IMPLIED WARRANTIES OF MERCHANTABILITY AND FITNESS FOR -- -- A PARTICULAR PURPOSE ARE DISCLAIMED. IN NO EVENT SHALL THE COPYRIGHT -- -- HOLDER OR CONTRIBUTORS BE LIABLE FOR ANY DIRECT, INDIRECT, INCIDENTAL, -- -- SPECIAL, EXEMPLARY, OR CONSEQUENTIAL DAMAGES (INCLUDING, BUT NOT LIMITED -- -- TO, PROCUREMENT OF SUBSTITUTE GOODS OR SERVICES; LOSS OF USE, DATA, OR -- -- PROFITS; OR BUSINESS INTERRUPTION) HOWEVER CAUSED AND ON ANY THEORY OF -- -- LIABILITY, WHETHER IN CONTRACT, STRICT LIABILITY, OR TORT (INCLUDING -- -- NEGLIGENCE OR OTHERWISE) ARISING IN ANY WAY OUT OF THE USE OF THIS -- -- SOFTWARE, EVEN IF ADVISED OF THE POSSIBILITY OF SUCH DAMAGE. -- -- -- ------------------------------------------------------------------------------ -- $Revision$ $Date$ ------------------------------------------------------------------------------ with Matreshka.DOM_Documents; with Matreshka.ODF_String_Constants; with ODF.DOM.Iterators; with ODF.DOM.Visitors; package body Matreshka.ODF_Presentation.Transition_Style_Attributes is ------------ -- Create -- ------------ overriding function Create (Parameters : not null access Matreshka.DOM_Attributes.Attribute_L2_Parameters) return Presentation_Transition_Style_Attribute_Node is begin return Self : Presentation_Transition_Style_Attribute_Node do Matreshka.ODF_Presentation.Constructors.Initialize (Self'Unchecked_Access, Parameters.Document, Matreshka.ODF_String_Constants.Presentation_Prefix); end return; end Create; -------------------- -- Get_Local_Name -- -------------------- overriding function Get_Local_Name (Self : not null access constant Presentation_Transition_Style_Attribute_Node) return League.Strings.Universal_String is pragma Unreferenced (Self); begin return Matreshka.ODF_String_Constants.Transition_Style_Attribute; end Get_Local_Name; begin Matreshka.DOM_Documents.Register_Attribute (Matreshka.ODF_String_Constants.Presentation_URI, Matreshka.ODF_String_Constants.Transition_Style_Attribute, Presentation_Transition_Style_Attribute_Node'Tag); end Matreshka.ODF_Presentation.Transition_Style_Attributes;
reznikmm/matreshka
Ada
5,460
ads
------------------------------------------------------------------------------ -- -- -- Matreshka Project -- -- -- -- Ada Modeling Framework -- -- -- -- Runtime Library Component -- -- -- ------------------------------------------------------------------------------ -- -- -- Copyright © 2011-2012, Vadim Godunko <[email protected]> -- -- All rights reserved. -- -- -- -- Redistribution and use in source and binary forms, with or without -- -- modification, are permitted provided that the following conditions -- -- are met: -- -- -- -- * Redistributions of source code must retain the above copyright -- -- notice, this list of conditions and the following disclaimer. -- -- -- -- * Redistributions in binary form must reproduce the above copyright -- -- notice, this list of conditions and the following disclaimer in the -- -- documentation and/or other materials provided with the distribution. -- -- -- -- * Neither the name of the Vadim Godunko, IE nor the names of its -- -- contributors may be used to endorse or promote products derived from -- -- this software without specific prior written permission. -- -- -- -- THIS SOFTWARE IS PROVIDED BY THE COPYRIGHT HOLDERS AND CONTRIBUTORS -- -- "AS IS" AND ANY EXPRESS OR IMPLIED WARRANTIES, INCLUDING, BUT NOT -- -- LIMITED TO, THE IMPLIED WARRANTIES OF MERCHANTABILITY AND FITNESS FOR -- -- A PARTICULAR PURPOSE ARE DISCLAIMED. IN NO EVENT SHALL THE COPYRIGHT -- -- HOLDER OR CONTRIBUTORS BE LIABLE FOR ANY DIRECT, INDIRECT, INCIDENTAL, -- -- SPECIAL, EXEMPLARY, OR CONSEQUENTIAL DAMAGES (INCLUDING, BUT NOT LIMITED -- -- TO, PROCUREMENT OF SUBSTITUTE GOODS OR SERVICES; LOSS OF USE, DATA, OR -- -- PROFITS; OR BUSINESS INTERRUPTION) HOWEVER CAUSED AND ON ANY THEORY OF -- -- LIABILITY, WHETHER IN CONTRACT, STRICT LIABILITY, OR TORT (INCLUDING -- -- NEGLIGENCE OR OTHERWISE) ARISING IN ANY WAY OUT OF THE USE OF THIS -- -- SOFTWARE, EVEN IF ADVISED OF THE POSSIBILITY OF SUCH DAMAGE. -- -- -- ------------------------------------------------------------------------------ -- $Revision$ $Date$ ------------------------------------------------------------------------------ -- This file is generated, don't edit it. ------------------------------------------------------------------------------ with AMF.Generic_Collections; package AMF.Standard_Profile_L2.Implements.Collections is pragma Preelaborate; package Standard_Profile_L2_Implement_Collections is new AMF.Generic_Collections (Standard_Profile_L2_Implement, Standard_Profile_L2_Implement_Access); type Set_Of_Standard_Profile_L2_Implement is new Standard_Profile_L2_Implement_Collections.Set with null record; Empty_Set_Of_Standard_Profile_L2_Implement : constant Set_Of_Standard_Profile_L2_Implement; type Ordered_Set_Of_Standard_Profile_L2_Implement is new Standard_Profile_L2_Implement_Collections.Ordered_Set with null record; Empty_Ordered_Set_Of_Standard_Profile_L2_Implement : constant Ordered_Set_Of_Standard_Profile_L2_Implement; type Bag_Of_Standard_Profile_L2_Implement is new Standard_Profile_L2_Implement_Collections.Bag with null record; Empty_Bag_Of_Standard_Profile_L2_Implement : constant Bag_Of_Standard_Profile_L2_Implement; type Sequence_Of_Standard_Profile_L2_Implement is new Standard_Profile_L2_Implement_Collections.Sequence with null record; Empty_Sequence_Of_Standard_Profile_L2_Implement : constant Sequence_Of_Standard_Profile_L2_Implement; private Empty_Set_Of_Standard_Profile_L2_Implement : constant Set_Of_Standard_Profile_L2_Implement := (Standard_Profile_L2_Implement_Collections.Set with null record); Empty_Ordered_Set_Of_Standard_Profile_L2_Implement : constant Ordered_Set_Of_Standard_Profile_L2_Implement := (Standard_Profile_L2_Implement_Collections.Ordered_Set with null record); Empty_Bag_Of_Standard_Profile_L2_Implement : constant Bag_Of_Standard_Profile_L2_Implement := (Standard_Profile_L2_Implement_Collections.Bag with null record); Empty_Sequence_Of_Standard_Profile_L2_Implement : constant Sequence_Of_Standard_Profile_L2_Implement := (Standard_Profile_L2_Implement_Collections.Sequence with null record); end AMF.Standard_Profile_L2.Implements.Collections;
reznikmm/matreshka
Ada
4,598
adb
------------------------------------------------------------------------------ -- -- -- Matreshka Project -- -- -- -- Open Document Toolkit -- -- -- -- Runtime Library Component -- -- -- ------------------------------------------------------------------------------ -- -- -- Copyright © 2014, Vadim Godunko <[email protected]> -- -- All rights reserved. -- -- -- -- Redistribution and use in source and binary forms, with or without -- -- modification, are permitted provided that the following conditions -- -- are met: -- -- -- -- * Redistributions of source code must retain the above copyright -- -- notice, this list of conditions and the following disclaimer. -- -- -- -- * Redistributions in binary form must reproduce the above copyright -- -- notice, this list of conditions and the following disclaimer in the -- -- documentation and/or other materials provided with the distribution. -- -- -- -- * Neither the name of the Vadim Godunko, IE nor the names of its -- -- contributors may be used to endorse or promote products derived from -- -- this software without specific prior written permission. -- -- -- -- THIS SOFTWARE IS PROVIDED BY THE COPYRIGHT HOLDERS AND CONTRIBUTORS -- -- "AS IS" AND ANY EXPRESS OR IMPLIED WARRANTIES, INCLUDING, BUT NOT -- -- LIMITED TO, THE IMPLIED WARRANTIES OF MERCHANTABILITY AND FITNESS FOR -- -- A PARTICULAR PURPOSE ARE DISCLAIMED. IN NO EVENT SHALL THE COPYRIGHT -- -- HOLDER OR CONTRIBUTORS BE LIABLE FOR ANY DIRECT, INDIRECT, INCIDENTAL, -- -- SPECIAL, EXEMPLARY, OR CONSEQUENTIAL DAMAGES (INCLUDING, BUT NOT LIMITED -- -- TO, PROCUREMENT OF SUBSTITUTE GOODS OR SERVICES; LOSS OF USE, DATA, OR -- -- PROFITS; OR BUSINESS INTERRUPTION) HOWEVER CAUSED AND ON ANY THEORY OF -- -- LIABILITY, WHETHER IN CONTRACT, STRICT LIABILITY, OR TORT (INCLUDING -- -- NEGLIGENCE OR OTHERWISE) ARISING IN ANY WAY OUT OF THE USE OF THIS -- -- SOFTWARE, EVEN IF ADVISED OF THE POSSIBILITY OF SUCH DAMAGE. -- -- -- ------------------------------------------------------------------------------ -- $Revision$ $Date$ ------------------------------------------------------------------------------ with Matreshka.DOM_Documents; with Matreshka.ODF_String_Constants; with ODF.DOM.Iterators; with ODF.DOM.Visitors; package body Matreshka.ODF_Svg.Alphabetic_Attributes is ------------ -- Create -- ------------ overriding function Create (Parameters : not null access Matreshka.DOM_Attributes.Attribute_L2_Parameters) return Svg_Alphabetic_Attribute_Node is begin return Self : Svg_Alphabetic_Attribute_Node do Matreshka.ODF_Svg.Constructors.Initialize (Self'Unchecked_Access, Parameters.Document, Matreshka.ODF_String_Constants.Svg_Prefix); end return; end Create; -------------------- -- Get_Local_Name -- -------------------- overriding function Get_Local_Name (Self : not null access constant Svg_Alphabetic_Attribute_Node) return League.Strings.Universal_String is pragma Unreferenced (Self); begin return Matreshka.ODF_String_Constants.Alphabetic_Attribute; end Get_Local_Name; begin Matreshka.DOM_Documents.Register_Attribute (Matreshka.ODF_String_Constants.Svg_URI, Matreshka.ODF_String_Constants.Alphabetic_Attribute, Svg_Alphabetic_Attribute_Node'Tag); end Matreshka.ODF_Svg.Alphabetic_Attributes;
dan76/Amass
Ada
1,928
ads
-- Copyright © by Jeff Foley 2017-2023. All rights reserved. -- Use of this source code is governed by Apache 2 LICENSE that can be found in the LICENSE file. -- SPDX-License-Identifier: Apache-2.0 local url = require("url") local json = require("json") name = "Ahrefs" type = "api" function start() set_rate_limit(1) end function check() local c local cfg = datasrc_config() if (cfg ~= nil) then c = cfg.credentials end if (c ~= nil and c.key ~= nil and c.key ~= "") then return true end return false end function vertical(ctx, domain) local c local cfg = datasrc_config() if (cfg ~= nil) then c = cfg.credentials end if (c == nil or c.key == nil or c.key == "") then return end local resp, err = request(ctx, {['url']=build_url(domain, c.key)}) if (err ~= nil and err ~= "") then log(ctx, "vertical request to service failed: " .. err) return elseif (resp.status_code < 200 or resp.status_code >= 400) then log(ctx, "vertical request to service returned with status: " .. resp.status) return end local d = json.decode(resp.body) if (d == nil) then log(ctx, "failed to decode the JSON response") return elseif (d.error ~= nil and d.error ~= "") then log(ctx, "error returned by the service: " .. j.error) return end for _, item in pairs(d.pages) do if (item ~= nil and item.url ~= nil and item.url ~= "") then send_names(ctx, item.url) end end end function build_url(domain, key) local params = { ['target']=domain, ['token']=key, ['from']="ahrefs_rank", ['mode']="subdomains", ['limit']="1000", ['order_by']="ahrefs_rank%3Adesc", ['output']="json", } return "https://apiv2.ahrefs.com/?" .. url.build_query_string(params) end
gshrikant/bbqueue-spark
Ada
6,075
ads
-- This unit is based on BBqueue.Offsets_Only and embeds an internal buffer. -- It provides directly usable slices of memory from its internal buffer: -- -- Q : aliased Buffer (64); -- WG : Write_Grant := Empty; -- S : Slice_Rec; -- begin -- Grant (Q, WG, 8); -- if State (WG) = Valid then -- declare -- B : Storage_Array (1 .. Slice (WG).Length) -- with Address => Slice (WG).Addr; -- begin -- B := (others => 42); -- end; -- Commit (Q, WG); -- end if; with System; package BBqueue.Buffers with Preelaborate, SPARK_Mode, Abstract_State => null is type Buffer (Size : Buffer_Size) is limited private; -- Producer -- type Write_Grant is limited private; procedure Grant (This : in out Buffer; G : in out Write_Grant; Size : Count) with Global => null, Pre => State (G) /= Valid, Post => State (G) in Valid | Empty | Grant_In_Progress | Insufficient_Size and then (if Size = 0 then State (G) = Empty) and then (if State (G) = Valid then Write_Grant_In_Progress (This) and then Slice (G).Length = Size); -- Request a contiguous writeable slice of the internal buffer procedure Commit (This : in out Buffer; G : in out Write_Grant; Size : Count := Count'Last) with Pre => State (G) = Valid, Post => (if Write_Grant_In_Progress (This)'Old then State (G) = Empty else State (G) = Valid); -- Commit a writeable slice. Size can be smaller than the granted slice for -- partial commits. The commited slice is then available for Read. generic with procedure Process_Write (Data : out Storage_Array; To_Commit : out Count); procedure Write_CB (This : in out Buffer; Size : Count; Result : out Result_Kind); -- Write in the buffer using a "callback". This procedure will call -- Process_Write () on the slice returned by Grant (), if the result -- is Valid. It will then call Commit with the value To_Commit returned by -- Process_Write (). -- Consumer -- type Read_Grant is limited private; procedure Read (This : in out Buffer; G : in out Read_Grant; Max : Count := Count'Last) with Pre => State (G) /= Valid, Post => State (G) in Valid | Empty | Grant_In_Progress and then (if State (G) = Valid then Read_Grant_In_Progress (This) and then Slice (G).Length <= Max); -- Request contiguous readable slice of up to Max elements from the internal -- buffer. procedure Release (This : in out Buffer; G : in out Read_Grant; Size : Count := Count'Last) with Pre => State (G) = Valid, Post => (if Read_Grant_In_Progress (This)'Old then State (G) = Empty else State (G) = Valid); -- Release a readable slice. Size can be smaller than the granted slice for -- partial releases. generic with procedure Process_Read (Data : Storage_Array; To_Release : out Count); procedure Read_CB (This : in out Buffer; Result : out Result_Kind); -- Read from the buffer using a "callback". This procedure will call -- Process_Read () on the slice returned by Read (), if the result is -- Valid. It will then call Release with the value To_Release returned -- by Process_Read (). -- Utils -- function Empty return Write_Grant with Post => State (Empty'Result) = Empty; function Empty return Read_Grant with Post => State (Empty'Result) = Empty; -- Slices -- type Slice_Rec is record Length : Count; Addr : System.Address; end record; function State (G : Write_Grant) return Result_Kind; function Slice (G : Write_Grant) return Slice_Rec with Pre => State (G) = Valid; function State (G : Read_Grant) return Result_Kind; function Slice (G : Read_Grant) return Slice_Rec with Pre => State (G) = Valid; function Write_Grant_In_Progress (This : Buffer) return Boolean with Ghost; function Read_Grant_In_Progress (This : Buffer) return Boolean with Ghost; private type Buffer (Size : Buffer_Size) is limited record Buf : Storage_Array (1 .. Size) := (others => 0); Offsets : Offsets_Only (Size); end record; function Empty_Slicerec return Slice_Rec is (0, System.Null_Address); type Write_Grant is limited record Offsets_Grant : BBqueue.Write_Grant; Slice : Slice_Rec := (0, System.Null_Address); end record; type Read_Grant is limited record Offsets_Grant : BBqueue.Read_Grant; Slice : Slice_Rec := (0, System.Null_Address); end record; function State (G : Write_Grant) return Result_Kind is (G.Offsets_Grant.Result); function Empty return Write_Grant is (Offsets_Grant => BBqueue.Empty, others => <>); function Slice (G : Write_Grant) return Slice_Rec is (G.Slice); function State (G : Read_Grant) return Result_Kind is (G.Offsets_Grant.Result); function Empty return Read_Grant is (Offsets_Grant => BBqueue.Empty, others => <>); function Slice (G : Read_Grant) return Slice_Rec is (G.Slice); ----------------------------- -- Write_Grant_In_Progress -- ----------------------------- function Write_Grant_In_Progress (This : Buffer) return Boolean is (BBqueue.Write_Grant_In_Progress (This.Offsets)); ---------------------------- -- Read_Grant_In_Progress -- ---------------------------- function Read_Grant_In_Progress (This : Buffer) return Boolean is (BBqueue.Read_Grant_In_Progress (This.Offsets)); end BBqueue.Buffers;
ekoeppen/STM32_Generic_Ada_Drivers
Ada
12,562
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.NVIC is pragma Preelaborate; --------------- -- Registers -- --------------- subtype IPR0_PRI_00_Field is STM32_SVD.UInt2; subtype IPR0_PRI_01_Field is STM32_SVD.UInt2; subtype IPR0_PRI_02_Field is STM32_SVD.UInt2; subtype IPR0_PRI_03_Field is STM32_SVD.UInt2; -- Interrupt Priority Register 0 type IPR0_Register is record -- unspecified Reserved_0_5 : STM32_SVD.UInt6 := 16#0#; -- PRI_00 PRI_00 : IPR0_PRI_00_Field := 16#0#; -- unspecified Reserved_8_13 : STM32_SVD.UInt6 := 16#0#; -- PRI_01 PRI_01 : IPR0_PRI_01_Field := 16#0#; -- unspecified Reserved_16_21 : STM32_SVD.UInt6 := 16#0#; -- PRI_02 PRI_02 : IPR0_PRI_02_Field := 16#0#; -- unspecified Reserved_24_29 : STM32_SVD.UInt6 := 16#0#; -- PRI_03 PRI_03 : IPR0_PRI_03_Field := 16#0#; end record with Volatile_Full_Access, Size => 32, Bit_Order => System.Low_Order_First; for IPR0_Register use record Reserved_0_5 at 0 range 0 .. 5; PRI_00 at 0 range 6 .. 7; Reserved_8_13 at 0 range 8 .. 13; PRI_01 at 0 range 14 .. 15; Reserved_16_21 at 0 range 16 .. 21; PRI_02 at 0 range 22 .. 23; Reserved_24_29 at 0 range 24 .. 29; PRI_03 at 0 range 30 .. 31; end record; subtype IPR1_PRI_40_Field is STM32_SVD.UInt2; subtype IPR1_PRI_41_Field is STM32_SVD.UInt2; subtype IPR1_PRI_42_Field is STM32_SVD.UInt2; subtype IPR1_PRI_43_Field is STM32_SVD.UInt2; -- Interrupt Priority Register 1 type IPR1_Register is record -- unspecified Reserved_0_5 : STM32_SVD.UInt6 := 16#0#; -- PRI_40 PRI_40 : IPR1_PRI_40_Field := 16#0#; -- unspecified Reserved_8_13 : STM32_SVD.UInt6 := 16#0#; -- PRI_41 PRI_41 : IPR1_PRI_41_Field := 16#0#; -- unspecified Reserved_16_21 : STM32_SVD.UInt6 := 16#0#; -- PRI_42 PRI_42 : IPR1_PRI_42_Field := 16#0#; -- unspecified Reserved_24_29 : STM32_SVD.UInt6 := 16#0#; -- PRI_43 PRI_43 : IPR1_PRI_43_Field := 16#0#; end record with Volatile_Full_Access, Size => 32, Bit_Order => System.Low_Order_First; for IPR1_Register use record Reserved_0_5 at 0 range 0 .. 5; PRI_40 at 0 range 6 .. 7; Reserved_8_13 at 0 range 8 .. 13; PRI_41 at 0 range 14 .. 15; Reserved_16_21 at 0 range 16 .. 21; PRI_42 at 0 range 22 .. 23; Reserved_24_29 at 0 range 24 .. 29; PRI_43 at 0 range 30 .. 31; end record; subtype IPR2_PRI_80_Field is STM32_SVD.UInt2; subtype IPR2_PRI_81_Field is STM32_SVD.UInt2; subtype IPR2_PRI_82_Field is STM32_SVD.UInt2; subtype IPR2_PRI_83_Field is STM32_SVD.UInt2; -- Interrupt Priority Register 2 type IPR2_Register is record -- unspecified Reserved_0_5 : STM32_SVD.UInt6 := 16#0#; -- PRI_80 PRI_80 : IPR2_PRI_80_Field := 16#0#; -- unspecified Reserved_8_13 : STM32_SVD.UInt6 := 16#0#; -- PRI_81 PRI_81 : IPR2_PRI_81_Field := 16#0#; -- unspecified Reserved_16_21 : STM32_SVD.UInt6 := 16#0#; -- PRI_82 PRI_82 : IPR2_PRI_82_Field := 16#0#; -- unspecified Reserved_24_29 : STM32_SVD.UInt6 := 16#0#; -- PRI_83 PRI_83 : IPR2_PRI_83_Field := 16#0#; end record with Volatile_Full_Access, Size => 32, Bit_Order => System.Low_Order_First; for IPR2_Register use record Reserved_0_5 at 0 range 0 .. 5; PRI_80 at 0 range 6 .. 7; Reserved_8_13 at 0 range 8 .. 13; PRI_81 at 0 range 14 .. 15; Reserved_16_21 at 0 range 16 .. 21; PRI_82 at 0 range 22 .. 23; Reserved_24_29 at 0 range 24 .. 29; PRI_83 at 0 range 30 .. 31; end record; subtype IPR3_PRI_120_Field is STM32_SVD.UInt2; subtype IPR3_PRI_121_Field is STM32_SVD.UInt2; subtype IPR3_PRI_122_Field is STM32_SVD.UInt2; subtype IPR3_PRI_123_Field is STM32_SVD.UInt2; -- Interrupt Priority Register 3 type IPR3_Register is record -- unspecified Reserved_0_5 : STM32_SVD.UInt6 := 16#0#; -- PRI_120 PRI_120 : IPR3_PRI_120_Field := 16#0#; -- unspecified Reserved_8_13 : STM32_SVD.UInt6 := 16#0#; -- PRI_121 PRI_121 : IPR3_PRI_121_Field := 16#0#; -- unspecified Reserved_16_21 : STM32_SVD.UInt6 := 16#0#; -- PRI_122 PRI_122 : IPR3_PRI_122_Field := 16#0#; -- unspecified Reserved_24_29 : STM32_SVD.UInt6 := 16#0#; -- PRI_123 PRI_123 : IPR3_PRI_123_Field := 16#0#; end record with Volatile_Full_Access, Size => 32, Bit_Order => System.Low_Order_First; for IPR3_Register use record Reserved_0_5 at 0 range 0 .. 5; PRI_120 at 0 range 6 .. 7; Reserved_8_13 at 0 range 8 .. 13; PRI_121 at 0 range 14 .. 15; Reserved_16_21 at 0 range 16 .. 21; PRI_122 at 0 range 22 .. 23; Reserved_24_29 at 0 range 24 .. 29; PRI_123 at 0 range 30 .. 31; end record; subtype IPR4_PRI_160_Field is STM32_SVD.UInt2; subtype IPR4_PRI_161_Field is STM32_SVD.UInt2; subtype IPR4_PRI_162_Field is STM32_SVD.UInt2; subtype IPR4_PRI_163_Field is STM32_SVD.UInt2; -- Interrupt Priority Register 4 type IPR4_Register is record -- unspecified Reserved_0_5 : STM32_SVD.UInt6 := 16#0#; -- PRI_160 PRI_160 : IPR4_PRI_160_Field := 16#0#; -- unspecified Reserved_8_13 : STM32_SVD.UInt6 := 16#0#; -- PRI_161 PRI_161 : IPR4_PRI_161_Field := 16#0#; -- unspecified Reserved_16_21 : STM32_SVD.UInt6 := 16#0#; -- PRI_162 PRI_162 : IPR4_PRI_162_Field := 16#0#; -- unspecified Reserved_24_29 : STM32_SVD.UInt6 := 16#0#; -- PRI_163 PRI_163 : IPR4_PRI_163_Field := 16#0#; end record with Volatile_Full_Access, Size => 32, Bit_Order => System.Low_Order_First; for IPR4_Register use record Reserved_0_5 at 0 range 0 .. 5; PRI_160 at 0 range 6 .. 7; Reserved_8_13 at 0 range 8 .. 13; PRI_161 at 0 range 14 .. 15; Reserved_16_21 at 0 range 16 .. 21; PRI_162 at 0 range 22 .. 23; Reserved_24_29 at 0 range 24 .. 29; PRI_163 at 0 range 30 .. 31; end record; subtype IPR5_PRI_200_Field is STM32_SVD.UInt2; subtype IPR5_PRI_201_Field is STM32_SVD.UInt2; subtype IPR5_PRI_202_Field is STM32_SVD.UInt2; subtype IPR5_PRI_203_Field is STM32_SVD.UInt2; -- Interrupt Priority Register 5 type IPR5_Register is record -- unspecified Reserved_0_5 : STM32_SVD.UInt6 := 16#0#; -- PRI_200 PRI_200 : IPR5_PRI_200_Field := 16#0#; -- unspecified Reserved_8_13 : STM32_SVD.UInt6 := 16#0#; -- PRI_201 PRI_201 : IPR5_PRI_201_Field := 16#0#; -- unspecified Reserved_16_21 : STM32_SVD.UInt6 := 16#0#; -- PRI_202 PRI_202 : IPR5_PRI_202_Field := 16#0#; -- unspecified Reserved_24_29 : STM32_SVD.UInt6 := 16#0#; -- PRI_203 PRI_203 : IPR5_PRI_203_Field := 16#0#; end record with Volatile_Full_Access, Size => 32, Bit_Order => System.Low_Order_First; for IPR5_Register use record Reserved_0_5 at 0 range 0 .. 5; PRI_200 at 0 range 6 .. 7; Reserved_8_13 at 0 range 8 .. 13; PRI_201 at 0 range 14 .. 15; Reserved_16_21 at 0 range 16 .. 21; PRI_202 at 0 range 22 .. 23; Reserved_24_29 at 0 range 24 .. 29; PRI_203 at 0 range 30 .. 31; end record; subtype IPR6_PRI_240_Field is STM32_SVD.UInt2; subtype IPR6_PRI_241_Field is STM32_SVD.UInt2; subtype IPR6_PRI_242_Field is STM32_SVD.UInt2; subtype IPR6_PRI_243_Field is STM32_SVD.UInt2; -- Interrupt Priority Register 6 type IPR6_Register is record -- unspecified Reserved_0_5 : STM32_SVD.UInt6 := 16#0#; -- PRI_240 PRI_240 : IPR6_PRI_240_Field := 16#0#; -- unspecified Reserved_8_13 : STM32_SVD.UInt6 := 16#0#; -- PRI_241 PRI_241 : IPR6_PRI_241_Field := 16#0#; -- unspecified Reserved_16_21 : STM32_SVD.UInt6 := 16#0#; -- PRI_242 PRI_242 : IPR6_PRI_242_Field := 16#0#; -- unspecified Reserved_24_29 : STM32_SVD.UInt6 := 16#0#; -- PRI_243 PRI_243 : IPR6_PRI_243_Field := 16#0#; end record with Volatile_Full_Access, Size => 32, Bit_Order => System.Low_Order_First; for IPR6_Register use record Reserved_0_5 at 0 range 0 .. 5; PRI_240 at 0 range 6 .. 7; Reserved_8_13 at 0 range 8 .. 13; PRI_241 at 0 range 14 .. 15; Reserved_16_21 at 0 range 16 .. 21; PRI_242 at 0 range 22 .. 23; Reserved_24_29 at 0 range 24 .. 29; PRI_243 at 0 range 30 .. 31; end record; subtype IPR7_PRI_280_Field is STM32_SVD.UInt2; subtype IPR7_PRI_281_Field is STM32_SVD.UInt2; subtype IPR7_PRI_282_Field is STM32_SVD.UInt2; subtype IPR7_PRI_283_Field is STM32_SVD.UInt2; -- Interrupt Priority Register 7 type IPR7_Register is record -- unspecified Reserved_0_5 : STM32_SVD.UInt6 := 16#0#; -- PRI_280 PRI_280 : IPR7_PRI_280_Field := 16#0#; -- unspecified Reserved_8_13 : STM32_SVD.UInt6 := 16#0#; -- PRI_281 PRI_281 : IPR7_PRI_281_Field := 16#0#; -- unspecified Reserved_16_21 : STM32_SVD.UInt6 := 16#0#; -- PRI_282 PRI_282 : IPR7_PRI_282_Field := 16#0#; -- unspecified Reserved_24_29 : STM32_SVD.UInt6 := 16#0#; -- PRI_283 PRI_283 : IPR7_PRI_283_Field := 16#0#; end record with Volatile_Full_Access, Size => 32, Bit_Order => System.Low_Order_First; for IPR7_Register use record Reserved_0_5 at 0 range 0 .. 5; PRI_280 at 0 range 6 .. 7; Reserved_8_13 at 0 range 8 .. 13; PRI_281 at 0 range 14 .. 15; Reserved_16_21 at 0 range 16 .. 21; PRI_282 at 0 range 22 .. 23; Reserved_24_29 at 0 range 24 .. 29; PRI_283 at 0 range 30 .. 31; end record; ----------------- -- Peripherals -- ----------------- -- Nested Vectored Interrupt Controller type NVIC_Peripheral is record -- Interrupt Set Enable Register ISER : aliased STM32_SVD.UInt32; -- Interrupt Clear Enable Register ICER : aliased STM32_SVD.UInt32; -- Interrupt Set-Pending Register ISPR : aliased STM32_SVD.UInt32; -- Interrupt Clear-Pending Register ICPR : aliased STM32_SVD.UInt32; -- Interrupt Priority Register 0 IPR0 : aliased IPR0_Register; -- Interrupt Priority Register 1 IPR1 : aliased IPR1_Register; -- Interrupt Priority Register 2 IPR2 : aliased IPR2_Register; -- Interrupt Priority Register 3 IPR3 : aliased IPR3_Register; -- Interrupt Priority Register 4 IPR4 : aliased IPR4_Register; -- Interrupt Priority Register 5 IPR5 : aliased IPR5_Register; -- Interrupt Priority Register 6 IPR6 : aliased IPR6_Register; -- Interrupt Priority Register 7 IPR7 : aliased IPR7_Register; end record with Volatile; for NVIC_Peripheral use record ISER at 16#0# range 0 .. 31; ICER at 16#80# range 0 .. 31; ISPR at 16#100# range 0 .. 31; ICPR at 16#180# range 0 .. 31; IPR0 at 16#300# range 0 .. 31; IPR1 at 16#304# range 0 .. 31; IPR2 at 16#308# range 0 .. 31; IPR3 at 16#30C# range 0 .. 31; IPR4 at 16#310# range 0 .. 31; IPR5 at 16#314# range 0 .. 31; IPR6 at 16#318# range 0 .. 31; IPR7 at 16#31C# range 0 .. 31; end record; -- Nested Vectored Interrupt Controller NVIC_Periph : aliased NVIC_Peripheral with Import, Address => System'To_Address (16#E000E100#); end STM32_SVD.NVIC;
optikos/oasis
Ada
5,200
ads
-- Copyright (c) 2019 Maxim Reznik <[email protected]> -- -- SPDX-License-Identifier: MIT -- License-Filename: LICENSE ------------------------------------------------------------- with Program.Elements.Defining_Identifiers; with Program.Lexical_Elements; with Program.Elements.Expressions; with Program.Elements.Number_Declarations; with Program.Element_Visitors; package Program.Nodes.Number_Declarations is pragma Preelaborate; type Number_Declaration is new Program.Nodes.Node and Program.Elements.Number_Declarations.Number_Declaration and Program.Elements.Number_Declarations.Number_Declaration_Text with private; function Create (Names : not null Program.Elements.Defining_Identifiers .Defining_Identifier_Vector_Access; Colon_Token : not null Program.Lexical_Elements .Lexical_Element_Access; Constant_Token : not null Program.Lexical_Elements .Lexical_Element_Access; Assignment_Token : not null Program.Lexical_Elements .Lexical_Element_Access; Expression : not null Program.Elements.Expressions .Expression_Access; Semicolon_Token : not null Program.Lexical_Elements .Lexical_Element_Access) return Number_Declaration; type Implicit_Number_Declaration is new Program.Nodes.Node and Program.Elements.Number_Declarations.Number_Declaration with private; function Create (Names : not null Program.Elements.Defining_Identifiers .Defining_Identifier_Vector_Access; Expression : not null Program.Elements.Expressions .Expression_Access; Is_Part_Of_Implicit : Boolean := False; Is_Part_Of_Inherited : Boolean := False; Is_Part_Of_Instance : Boolean := False) return Implicit_Number_Declaration with Pre => Is_Part_Of_Implicit or Is_Part_Of_Inherited or Is_Part_Of_Instance; private type Base_Number_Declaration is abstract new Program.Nodes.Node and Program.Elements.Number_Declarations.Number_Declaration with record Names : not null Program.Elements.Defining_Identifiers .Defining_Identifier_Vector_Access; Expression : not null Program.Elements.Expressions.Expression_Access; end record; procedure Initialize (Self : aliased in out Base_Number_Declaration'Class); overriding procedure Visit (Self : not null access Base_Number_Declaration; Visitor : in out Program.Element_Visitors.Element_Visitor'Class); overriding function Names (Self : Base_Number_Declaration) return not null Program.Elements.Defining_Identifiers .Defining_Identifier_Vector_Access; overriding function Expression (Self : Base_Number_Declaration) return not null Program.Elements.Expressions.Expression_Access; overriding function Is_Number_Declaration_Element (Self : Base_Number_Declaration) return Boolean; overriding function Is_Declaration_Element (Self : Base_Number_Declaration) return Boolean; type Number_Declaration is new Base_Number_Declaration and Program.Elements.Number_Declarations.Number_Declaration_Text with record Colon_Token : not null Program.Lexical_Elements .Lexical_Element_Access; Constant_Token : not null Program.Lexical_Elements .Lexical_Element_Access; Assignment_Token : not null Program.Lexical_Elements .Lexical_Element_Access; Semicolon_Token : not null Program.Lexical_Elements .Lexical_Element_Access; end record; overriding function To_Number_Declaration_Text (Self : aliased in out Number_Declaration) return Program.Elements.Number_Declarations .Number_Declaration_Text_Access; overriding function Colon_Token (Self : Number_Declaration) return not null Program.Lexical_Elements.Lexical_Element_Access; overriding function Constant_Token (Self : Number_Declaration) return not null Program.Lexical_Elements.Lexical_Element_Access; overriding function Assignment_Token (Self : Number_Declaration) return not null Program.Lexical_Elements.Lexical_Element_Access; overriding function Semicolon_Token (Self : Number_Declaration) return not null Program.Lexical_Elements.Lexical_Element_Access; type Implicit_Number_Declaration is new Base_Number_Declaration with record Is_Part_Of_Implicit : Boolean; Is_Part_Of_Inherited : Boolean; Is_Part_Of_Instance : Boolean; end record; overriding function To_Number_Declaration_Text (Self : aliased in out Implicit_Number_Declaration) return Program.Elements.Number_Declarations .Number_Declaration_Text_Access; overriding function Is_Part_Of_Implicit (Self : Implicit_Number_Declaration) return Boolean; overriding function Is_Part_Of_Inherited (Self : Implicit_Number_Declaration) return Boolean; overriding function Is_Part_Of_Instance (Self : Implicit_Number_Declaration) return Boolean; end Program.Nodes.Number_Declarations;
reznikmm/matreshka
Ada
4,097
ads
------------------------------------------------------------------------------ -- -- -- Matreshka Project -- -- -- -- Open Document Toolkit -- -- -- -- Runtime Library Component -- -- -- ------------------------------------------------------------------------------ -- -- -- Copyright © 2014, Vadim Godunko <[email protected]> -- -- All rights reserved. -- -- -- -- Redistribution and use in source and binary forms, with or without -- -- modification, are permitted provided that the following conditions -- -- are met: -- -- -- -- * Redistributions of source code must retain the above copyright -- -- notice, this list of conditions and the following disclaimer. -- -- -- -- * Redistributions in binary form must reproduce the above copyright -- -- notice, this list of conditions and the following disclaimer in the -- -- documentation and/or other materials provided with the distribution. -- -- -- -- * Neither the name of the Vadim Godunko, IE nor the names of its -- -- contributors may be used to endorse or promote products derived from -- -- this software without specific prior written permission. -- -- -- -- THIS SOFTWARE IS PROVIDED BY THE COPYRIGHT HOLDERS AND CONTRIBUTORS -- -- "AS IS" AND ANY EXPRESS OR IMPLIED WARRANTIES, INCLUDING, BUT NOT -- -- LIMITED TO, THE IMPLIED WARRANTIES OF MERCHANTABILITY AND FITNESS FOR -- -- A PARTICULAR PURPOSE ARE DISCLAIMED. IN NO EVENT SHALL THE COPYRIGHT -- -- HOLDER OR CONTRIBUTORS BE LIABLE FOR ANY DIRECT, INDIRECT, INCIDENTAL, -- -- SPECIAL, EXEMPLARY, OR CONSEQUENTIAL DAMAGES (INCLUDING, BUT NOT LIMITED -- -- TO, PROCUREMENT OF SUBSTITUTE GOODS OR SERVICES; LOSS OF USE, DATA, OR -- -- PROFITS; OR BUSINESS INTERRUPTION) HOWEVER CAUSED AND ON ANY THEORY OF -- -- LIABILITY, WHETHER IN CONTRACT, STRICT LIABILITY, OR TORT (INCLUDING -- -- NEGLIGENCE OR OTHERWISE) ARISING IN ANY WAY OUT OF THE USE OF THIS -- -- SOFTWARE, EVEN IF ADVISED OF THE POSSIBILITY OF SUCH DAMAGE. -- -- -- ------------------------------------------------------------------------------ -- $Revision$ $Date$ ------------------------------------------------------------------------------ with ODF.DOM.Draw_Handle_Mirror_Vertical_Attributes; package Matreshka.ODF_Draw.Handle_Mirror_Vertical_Attributes is type Draw_Handle_Mirror_Vertical_Attribute_Node is new Matreshka.ODF_Draw.Abstract_Draw_Attribute_Node and ODF.DOM.Draw_Handle_Mirror_Vertical_Attributes.ODF_Draw_Handle_Mirror_Vertical_Attribute with null record; overriding function Create (Parameters : not null access Matreshka.DOM_Attributes.Attribute_L2_Parameters) return Draw_Handle_Mirror_Vertical_Attribute_Node; overriding function Get_Local_Name (Self : not null access constant Draw_Handle_Mirror_Vertical_Attribute_Node) return League.Strings.Universal_String; end Matreshka.ODF_Draw.Handle_Mirror_Vertical_Attributes;
stcarrez/swagger-ada
Ada
1,131
adb
----------------------------------------------------------------------- -- swagger_harness -- Unit tests -- Copyright (C) 2017, 2019 Stephane Carrez -- Written by Stephane Carrez ([email protected]) -- -- Licensed under the Apache License, Version 2.0 (the "License"); -- you may not use this file except in compliance with the License. -- You may obtain a copy of the License at -- -- http://www.apache.org/licenses/LICENSE-2.0 -- -- Unless required by applicable law or agreed to in writing, software -- distributed under the License is distributed on an "AS IS" BASIS, -- WITHOUT WARRANTIES OR CONDITIONS OF ANY KIND, either express or implied. -- See the License for the specific language governing permissions and -- limitations under the License. ----------------------------------------------------------------------- with Swagger.Testsuite; with Util.Tests; with Util.Http.Clients.Curl; procedure Swagger_Harness_Curl is procedure Harness is new Util.Tests.Harness (Swagger.Testsuite.Suite); begin Util.Http.Clients.Curl.Register; Harness ("swagger-tests.xml"); end Swagger_Harness_Curl;
ytomino/gnat4drake
Ada
156
ads
pragma License (Unrestricted); with Ada.Wide_Wide_Characters.Latin_1; package Ada.Characters.Wide_Wide_Latin_1 renames Ada.Wide_Wide_Characters.Latin_1;
reznikmm/matreshka
Ada
3,943
ads
------------------------------------------------------------------------------ -- -- -- Matreshka Project -- -- -- -- Open Document Toolkit -- -- -- -- Runtime Library Component -- -- -- ------------------------------------------------------------------------------ -- -- -- Copyright © 2014, Vadim Godunko <[email protected]> -- -- All rights reserved. -- -- -- -- Redistribution and use in source and binary forms, with or without -- -- modification, are permitted provided that the following conditions -- -- are met: -- -- -- -- * Redistributions of source code must retain the above copyright -- -- notice, this list of conditions and the following disclaimer. -- -- -- -- * Redistributions in binary form must reproduce the above copyright -- -- notice, this list of conditions and the following disclaimer in the -- -- documentation and/or other materials provided with the distribution. -- -- -- -- * Neither the name of the Vadim Godunko, IE nor the names of its -- -- contributors may be used to endorse or promote products derived from -- -- this software without specific prior written permission. -- -- -- -- THIS SOFTWARE IS PROVIDED BY THE COPYRIGHT HOLDERS AND CONTRIBUTORS -- -- "AS IS" AND ANY EXPRESS OR IMPLIED WARRANTIES, INCLUDING, BUT NOT -- -- LIMITED TO, THE IMPLIED WARRANTIES OF MERCHANTABILITY AND FITNESS FOR -- -- A PARTICULAR PURPOSE ARE DISCLAIMED. IN NO EVENT SHALL THE COPYRIGHT -- -- HOLDER OR CONTRIBUTORS BE LIABLE FOR ANY DIRECT, INDIRECT, INCIDENTAL, -- -- SPECIAL, EXEMPLARY, OR CONSEQUENTIAL DAMAGES (INCLUDING, BUT NOT LIMITED -- -- TO, PROCUREMENT OF SUBSTITUTE GOODS OR SERVICES; LOSS OF USE, DATA, OR -- -- PROFITS; OR BUSINESS INTERRUPTION) HOWEVER CAUSED AND ON ANY THEORY OF -- -- LIABILITY, WHETHER IN CONTRACT, STRICT LIABILITY, OR TORT (INCLUDING -- -- NEGLIGENCE OR OTHERWISE) ARISING IN ANY WAY OUT OF THE USE OF THIS -- -- SOFTWARE, EVEN IF ADVISED OF THE POSSIBILITY OF SUCH DAMAGE. -- -- -- ------------------------------------------------------------------------------ -- $Revision$ $Date$ ------------------------------------------------------------------------------ with ODF.DOM.Svg_Name_Attributes; package Matreshka.ODF_Svg.Name_Attributes is type Svg_Name_Attribute_Node is new Matreshka.ODF_Svg.Abstract_Svg_Attribute_Node and ODF.DOM.Svg_Name_Attributes.ODF_Svg_Name_Attribute with null record; overriding function Create (Parameters : not null access Matreshka.DOM_Attributes.Attribute_L2_Parameters) return Svg_Name_Attribute_Node; overriding function Get_Local_Name (Self : not null access constant Svg_Name_Attribute_Node) return League.Strings.Universal_String; end Matreshka.ODF_Svg.Name_Attributes;
reznikmm/increment
Ada
3,143
ads
-- Copyright (c) 2015-2017 Maxim Reznik <[email protected]> -- -- SPDX-License-Identifier: MIT -- License-Filename: LICENSE ------------------------------------------------------------- with League.Strings; package Incr.Lexers.Batch_Lexers is -- @summary -- Batch Lexer -- -- @description -- This package provides batch lexical analyser and related types. type Batch_Lexer is abstract tagged limited private; -- Type to perform lexical analysis type Batch_Lexer_Access is access all Batch_Lexer'Class; type Abstract_Source is abstract tagged limited null record; -- Abstract source of text for lexer type Source_Access is access all Abstract_Source'Class; not overriding function Get_Next (Self : not null access Abstract_Source) return Wide_Wide_Character is abstract; -- Retrive next character of text. Return End_Of_Input when no more data -- available. End_Of_Input : constant Wide_Wide_Character := Wide_Wide_Character'Val (4); -- Special character to represend end of input stream procedure Set_Source (Self : in out Batch_Lexer'Class; Source : not null Source_Access); -- Configure new text source before perform a lexical analysis. type State is new Natural; -- State of lexer automaton INITIAL : constant State := 0; -- Initial state of lexer, valid to start analysis from very begining procedure Set_Start_Condition (Self : in out Batch_Lexer'Class; Condition : State); -- Assign new state. function Get_Start_Condition (Self : Batch_Lexer'Class) return State; -- Return current lexer state. type Rule_Index is new Natural; -- Recognized token rule, 0 for end of stream or error. not overriding procedure Get_Token (Self : access Batch_Lexer; Result : out Rule_Index) is abstract; -- Recognize next token in the stream and return its rule number. function Get_Text (Self : Batch_Lexer'Class) return League.Strings.Universal_String; -- Return text of last recognized token. function Get_Token_Length (Self : Batch_Lexer'Class) return Positive; -- Return length of text of last recognized token. function Get_Token_Lookahead (Self : Batch_Lexer'Class) return Positive; -- Return number of character seen by lexer after end of the last -- recognized token. type Character_Class is new Natural; private Buffer_Size : constant := 1024; -- Max length of any token subtype Buffer_Index is Positive range 1 .. Buffer_Size; type Character_Class_Array is array (Buffer_Index) of Character_Class; Error_Character : constant Character_Class := 0; type Batch_Lexer is abstract tagged limited record Source : Source_Access; Start : State := INITIAL; Next : Buffer_Index := 1; -- First empty position in Buffer To : Natural := 0; -- Last char of the last read token Rule : Rule_Index; -- Rule of the last read token Buffer : Wide_Wide_String (Buffer_Index); Classes : Character_Class_Array; end record; end Incr.Lexers.Batch_Lexers;
flyx/OpenGLAda
Ada
696
adb
-- part of OpenGLAda, (c) 2017 Felix Krause -- released under the terms of the MIT license, see the file "COPYING" package body GL.Helpers is function Float_Array (Value : Colors.Color) return Single_Array is use GL.Types.Colors; begin return Single_Array'(1 => Value (R), 2 => Value (G), 3 => Value (B), 4 => Value (A)); end Float_Array; function Color (Value : Single_Array) return Colors.Color is use GL.Types.Colors; begin return Colors.Color'(R => Value (1), G => Value (2), B => Value (3), A => Value (4)); end Color; end GL.Helpers;
reznikmm/matreshka
Ada
4,093
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.Number_Decimal_Replacement_Attributes; package Matreshka.ODF_Number.Decimal_Replacement_Attributes is type Number_Decimal_Replacement_Attribute_Node is new Matreshka.ODF_Number.Abstract_Number_Attribute_Node and ODF.DOM.Number_Decimal_Replacement_Attributes.ODF_Number_Decimal_Replacement_Attribute with null record; overriding function Create (Parameters : not null access Matreshka.DOM_Attributes.Attribute_L2_Parameters) return Number_Decimal_Replacement_Attribute_Node; overriding function Get_Local_Name (Self : not null access constant Number_Decimal_Replacement_Attribute_Node) return League.Strings.Universal_String; end Matreshka.ODF_Number.Decimal_Replacement_Attributes;
reznikmm/matreshka
Ada
3,537
ads
------------------------------------------------------------------------------ -- -- -- Matreshka Project -- -- -- -- Ada Modeling Framework -- -- -- -- Runtime Library Component -- -- -- ------------------------------------------------------------------------------ -- -- -- Copyright © 2011, Vadim Godunko <[email protected]> -- -- All rights reserved. -- -- -- -- Redistribution and use in source and binary forms, with or without -- -- modification, are permitted provided that the following conditions -- -- are met: -- -- -- -- * Redistributions of source code must retain the above copyright -- -- notice, this list of conditions and the following disclaimer. -- -- -- -- * Redistributions in binary form must reproduce the above copyright -- -- notice, this list of conditions and the following disclaimer in the -- -- documentation and/or other materials provided with the distribution. -- -- -- -- * Neither the name of the Vadim Godunko, IE nor the names of its -- -- contributors may be used to endorse or promote products derived from -- -- this software without specific prior written permission. -- -- -- -- THIS SOFTWARE IS PROVIDED BY THE COPYRIGHT HOLDERS AND CONTRIBUTORS -- -- "AS IS" AND ANY EXPRESS OR IMPLIED WARRANTIES, INCLUDING, BUT NOT -- -- LIMITED TO, THE IMPLIED WARRANTIES OF MERCHANTABILITY AND FITNESS FOR -- -- A PARTICULAR PURPOSE ARE DISCLAIMED. IN NO EVENT SHALL THE COPYRIGHT -- -- HOLDER OR CONTRIBUTORS BE LIABLE FOR ANY DIRECT, INDIRECT, INCIDENTAL, -- -- SPECIAL, EXEMPLARY, OR CONSEQUENTIAL DAMAGES (INCLUDING, BUT NOT LIMITED -- -- TO, PROCUREMENT OF SUBSTITUTE GOODS OR SERVICES; LOSS OF USE, DATA, OR -- -- PROFITS; OR BUSINESS INTERRUPTION) HOWEVER CAUSED AND ON ANY THEORY OF -- -- LIABILITY, WHETHER IN CONTRACT, STRICT LIABILITY, OR TORT (INCLUDING -- -- NEGLIGENCE OR OTHERWISE) ARISING IN ANY WAY OUT OF THE USE OF THIS -- -- SOFTWARE, EVEN IF ADVISED OF THE POSSIBILITY OF SUCH DAMAGE. -- -- -- ------------------------------------------------------------------------------ -- $Revision$ $Date$ ------------------------------------------------------------------------------ with League.Holders.Generic_Holders; package AMF.Holders.Unlimited_Naturals is new League.Holders.Generic_Holders (AMF.Unlimited_Natural); pragma Preelaborate (AMF.Holders.Unlimited_Naturals);
ekoeppen/STM32_Generic_Ada_Drivers
Ada
224
ads
package STM32GD.Power is subtype Millivolts is Natural range 0..4095; procedure Enable_Sleep; procedure Enable_Stop; procedure Enable_Standby; function Supply_Voltage return Millivolts; end STM32GD.Power;
stcarrez/hyperion
Ada
23,955
ads
----------------------------------------------------------------------- -- Hyperion.Monitoring.Models -- Hyperion.Monitoring.Models ----------------------------------------------------------------------- -- File generated by ada-gen DO NOT MODIFY -- Template used: templates/model/package-spec.xhtml -- Ada Generator: https://ada-gen.googlecode.com/svn/trunk Revision 1095 ----------------------------------------------------------------------- -- Copyright (C) 2019 Stephane Carrez -- Written by Stephane Carrez ([email protected]) -- -- Licensed under the Apache License, Version 2.0 (the "License"); -- you may not use this file except in compliance with the License. -- You may obtain a copy of the License at -- -- http://www.apache.org/licenses/LICENSE-2.0 -- -- Unless required by applicable law or agreed to in writing, software -- distributed under the License is distributed on an "AS IS" BASIS, -- WITHOUT WARRANTIES OR CONDITIONS OF ANY KIND, either express or implied. -- See the License for the specific language governing permissions and -- limitations under the License. ----------------------------------------------------------------------- pragma Warnings (Off); with ADO.Sessions; with ADO.Objects; with ADO.Statements; with ADO.SQL; with ADO.Schemas; with Ada.Calendar; with Ada.Containers.Vectors; with Ada.Strings.Unbounded; with Util.Beans.Objects; with Util.Beans.Objects.Enums; with Util.Beans.Basic.Lists; with Hyperion.Hosts.Models; pragma Warnings (On); package Hyperion.Monitoring.Models is pragma Style_Checks ("-mr"); type Format_Type is (FORMAT_JSON); for Format_Type use (FORMAT_JSON => 0); package Format_Type_Objects is new Util.Beans.Objects.Enums (Format_Type); type Nullable_Format_Type is record Is_Null : Boolean := True; Value : Format_Type; end record; type Snapshot_Ref is new ADO.Objects.Object_Ref with null record; type Source_Ref is new ADO.Objects.Object_Ref with null record; type Series_Ref is new ADO.Objects.Object_Ref with null record; -- Create an object key for Snapshot. function Snapshot_Key (Id : in ADO.Identifier) return ADO.Objects.Object_Key; -- Create an object key for Snapshot from a string. -- Raises Constraint_Error if the string cannot be converted into the object key. function Snapshot_Key (Id : in String) return ADO.Objects.Object_Key; Null_Snapshot : constant Snapshot_Ref; function "=" (Left, Right : Snapshot_Ref'Class) return Boolean; -- Set the snapshot identifier procedure Set_Id (Object : in out Snapshot_Ref; Value : in ADO.Identifier); -- Get the snapshot identifier function Get_Id (Object : in Snapshot_Ref) return ADO.Identifier; -- Set the snapshot date procedure Set_Start_Date (Object : in out Snapshot_Ref; Value : in Ada.Calendar.Time); -- Get the snapshot date function Get_Start_Date (Object : in Snapshot_Ref) return Ada.Calendar.Time; -- Set the snapshot end date. procedure Set_End_Date (Object : in out Snapshot_Ref; Value : in Ada.Calendar.Time); -- Get the snapshot end date. function Get_End_Date (Object : in Snapshot_Ref) return Ada.Calendar.Time; -- Get the optimistic lock version function Get_Version (Object : in Snapshot_Ref) return Integer; -- Set the host to which the snapshot is associated procedure Set_Host (Object : in out Snapshot_Ref; Value : in Hyperion.Hosts.Models.Host_Ref'Class); -- Get the host to which the snapshot is associated function Get_Host (Object : in Snapshot_Ref) return Hyperion.Hosts.Models.Host_Ref'Class; -- Load the entity identified by 'Id'. -- Raises the NOT_FOUND exception if it does not exist. procedure Load (Object : in out Snapshot_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 Snapshot_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 Snapshot_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 Snapshot_Ref; Session : in out ADO.Sessions.Master_Session'Class); -- Delete the entity. overriding procedure Delete (Object : in out Snapshot_Ref; Session : in out ADO.Sessions.Master_Session'Class); overriding function Get_Value (From : in Snapshot_Ref; Name : in String) return Util.Beans.Objects.Object; -- Table definition SNAPSHOT_TABLE : constant ADO.Schemas.Class_Mapping_Access; -- Internal method to allocate the Object_Record instance overriding procedure Allocate (Object : in out Snapshot_Ref); -- Copy of the object. procedure Copy (Object : in Snapshot_Ref; Into : in out Snapshot_Ref); package Snapshot_Vectors is new Ada.Containers.Vectors (Index_Type => Natural, Element_Type => Snapshot_Ref, "=" => "="); subtype Snapshot_Vector is Snapshot_Vectors.Vector; procedure List (Object : in out Snapshot_Vector; Session : in out ADO.Sessions.Session'Class; Query : in ADO.SQL.Query'Class); -- -------------------- -- The source describes an element of the system that is monitored and which -- for which we have collected data. -- -------------------- -- Create an object key for Source. function Source_Key (Id : in ADO.Identifier) return ADO.Objects.Object_Key; -- Create an object key for Source from a string. -- Raises Constraint_Error if the string cannot be converted into the object key. function Source_Key (Id : in String) return ADO.Objects.Object_Key; Null_Source : constant Source_Ref; function "=" (Left, Right : Source_Ref'Class) return Boolean; -- Set unique identifier. procedure Set_Id (Object : in out Source_Ref; Value : in ADO.Identifier); -- Get unique identifier. function Get_Id (Object : in Source_Ref) return ADO.Identifier; -- Set the time series name. procedure Set_Name (Object : in out Source_Ref; Value : in Ada.Strings.Unbounded.Unbounded_String); procedure Set_Name (Object : in out Source_Ref; Value : in String); -- Get the time series name. function Get_Name (Object : in Source_Ref) return Ada.Strings.Unbounded.Unbounded_String; function Get_Name (Object : in Source_Ref) return String; -- Set the label to be used in presentation. procedure Set_Label (Object : in out Source_Ref; Value : in Ada.Strings.Unbounded.Unbounded_String); procedure Set_Label (Object : in out Source_Ref; Value : in String); -- Get the label to be used in presentation. function Get_Label (Object : in Source_Ref) return Ada.Strings.Unbounded.Unbounded_String; function Get_Label (Object : in Source_Ref) return String; -- Get the optimistic lock version function Get_Version (Object : in Source_Ref) return Integer; -- Set the host to which the source is associated procedure Set_Host (Object : in out Source_Ref; Value : in Hyperion.Hosts.Models.Host_Ref'Class); -- Get the host to which the source is associated function Get_Host (Object : in Source_Ref) return Hyperion.Hosts.Models.Host_Ref'Class; -- Load the entity identified by 'Id'. -- Raises the NOT_FOUND exception if it does not exist. procedure Load (Object : in out Source_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 Source_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 Source_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 Source_Ref; Session : in out ADO.Sessions.Master_Session'Class); -- Delete the entity. overriding procedure Delete (Object : in out Source_Ref; Session : in out ADO.Sessions.Master_Session'Class); overriding function Get_Value (From : in Source_Ref; Name : in String) return Util.Beans.Objects.Object; -- Table definition SOURCE_TABLE : constant ADO.Schemas.Class_Mapping_Access; -- Internal method to allocate the Object_Record instance overriding procedure Allocate (Object : in out Source_Ref); -- Copy of the object. procedure Copy (Object : in Source_Ref; Into : in out Source_Ref); package Source_Vectors is new Ada.Containers.Vectors (Index_Type => Natural, Element_Type => Source_Ref, "=" => "="); subtype Source_Vector is Source_Vectors.Vector; procedure List (Object : in out Source_Vector; Session : in out ADO.Sessions.Session'Class; Query : in ADO.SQL.Query'Class); -- -------------------- -- The Series table holds the collected data -- for a given time frame. Values are serialized -- in the 'content' blob in a format described by -- the Format_Type enumeration. -- -------------------- -- Create an object key for Series. function Series_Key (Id : in ADO.Identifier) return ADO.Objects.Object_Key; -- Create an object key for Series from a string. -- Raises Constraint_Error if the string cannot be converted into the object key. function Series_Key (Id : in String) return ADO.Objects.Object_Key; Null_Series : constant Series_Ref; function "=" (Left, Right : Series_Ref'Class) return Boolean; -- Set the series unique identifier procedure Set_Id (Object : in out Series_Ref; Value : in ADO.Identifier); -- Get the series unique identifier function Get_Id (Object : in Series_Ref) return ADO.Identifier; -- Get the optimistic lock version. function Get_Version (Object : in Series_Ref) return Integer; -- Set the date and time of the first value in the series. procedure Set_Start_Date (Object : in out Series_Ref; Value : in Ada.Calendar.Time); -- Get the date and time of the first value in the series. function Get_Start_Date (Object : in Series_Ref) return Ada.Calendar.Time; -- Set the date and time of the last value in the series. procedure Set_End_Date (Object : in out Series_Ref; Value : in Ada.Calendar.Time); -- Get the date and time of the last value in the series. function Get_End_Date (Object : in Series_Ref) return Ada.Calendar.Time; -- Set the series content (JSON). procedure Set_Content (Object : in out Series_Ref; Value : in ADO.Blob_Ref); -- Get the series content (JSON). function Get_Content (Object : in Series_Ref) return ADO.Blob_Ref; -- Set the number of values in the series. procedure Set_Count (Object : in out Series_Ref; Value : in Integer); -- Get the number of values in the series. function Get_Count (Object : in Series_Ref) return Integer; -- Set the first value of the serie. procedure Set_First_Value (Object : in out Series_Ref; Value : in Integer); -- Get the first value of the serie. function Get_First_Value (Object : in Series_Ref) return Integer; -- Set the format of the content blob data. procedure Set_Format (Object : in out Series_Ref; Value : in Hyperion.Monitoring.Models.Format_Type); -- Get the format of the content blob data. function Get_Format (Object : in Series_Ref) return Hyperion.Monitoring.Models.Format_Type; -- procedure Set_Source (Object : in out Series_Ref; Value : in Hyperion.Monitoring.Models.Source_Ref'Class); -- function Get_Source (Object : in Series_Ref) return Hyperion.Monitoring.Models.Source_Ref'Class; -- Set the snapshot that produced the series procedure Set_Snapshot (Object : in out Series_Ref; Value : in Hyperion.Monitoring.Models.Snapshot_Ref'Class); -- Get the snapshot that produced the series function Get_Snapshot (Object : in Series_Ref) return Hyperion.Monitoring.Models.Snapshot_Ref'Class; -- Load the entity identified by 'Id'. -- Raises the NOT_FOUND exception if it does not exist. procedure Load (Object : in out Series_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 Series_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 Series_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 Series_Ref; Session : in out ADO.Sessions.Master_Session'Class); -- Delete the entity. overriding procedure Delete (Object : in out Series_Ref; Session : in out ADO.Sessions.Master_Session'Class); overriding function Get_Value (From : in Series_Ref; Name : in String) return Util.Beans.Objects.Object; -- Table definition SERIES_TABLE : constant ADO.Schemas.Class_Mapping_Access; -- Internal method to allocate the Object_Record instance overriding procedure Allocate (Object : in out Series_Ref); -- Copy of the object. procedure Copy (Object : in Series_Ref; Into : in out Series_Ref); private SNAPSHOT_NAME : aliased constant String := "hyperion_snapshot"; COL_0_1_NAME : aliased constant String := "id"; COL_1_1_NAME : aliased constant String := "start_date"; COL_2_1_NAME : aliased constant String := "end_date"; COL_3_1_NAME : aliased constant String := "version"; COL_4_1_NAME : aliased constant String := "host_id"; SNAPSHOT_DEF : aliased constant ADO.Schemas.Class_Mapping := (Count => 5, Table => SNAPSHOT_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, 5 => COL_4_1_NAME'Access) ); SNAPSHOT_TABLE : constant ADO.Schemas.Class_Mapping_Access := SNAPSHOT_DEF'Access; Null_Snapshot : constant Snapshot_Ref := Snapshot_Ref'(ADO.Objects.Object_Ref with null record); type Snapshot_Impl is new ADO.Objects.Object_Record (Key_Type => ADO.Objects.KEY_INTEGER, Of_Class => SNAPSHOT_DEF'Access) with record Start_Date : Ada.Calendar.Time; End_Date : Ada.Calendar.Time; Version : Integer; Host : Hyperion.Hosts.Models.Host_Ref; end record; type Snapshot_Access is access all Snapshot_Impl; overriding procedure Destroy (Object : access Snapshot_Impl); overriding procedure Find (Object : in out Snapshot_Impl; Session : in out ADO.Sessions.Session'Class; Query : in ADO.SQL.Query'Class; Found : out Boolean); overriding procedure Load (Object : in out Snapshot_Impl; Session : in out ADO.Sessions.Session'Class); procedure Load (Object : in out Snapshot_Impl; Stmt : in out ADO.Statements.Query_Statement'Class; Session : in out ADO.Sessions.Session'Class); overriding procedure Save (Object : in out Snapshot_Impl; Session : in out ADO.Sessions.Master_Session'Class); procedure Create (Object : in out Snapshot_Impl; Session : in out ADO.Sessions.Master_Session'Class); overriding procedure Delete (Object : in out Snapshot_Impl; Session : in out ADO.Sessions.Master_Session'Class); procedure Set_Field (Object : in out Snapshot_Ref'Class; Impl : out Snapshot_Access); SOURCE_NAME : aliased constant String := "hyperion_source"; COL_0_2_NAME : aliased constant String := "id"; COL_1_2_NAME : aliased constant String := "name"; COL_2_2_NAME : aliased constant String := "label"; COL_3_2_NAME : aliased constant String := "version"; COL_4_2_NAME : aliased constant String := "host_id"; SOURCE_DEF : aliased constant ADO.Schemas.Class_Mapping := (Count => 5, Table => SOURCE_NAME'Access, Members => ( 1 => COL_0_2_NAME'Access, 2 => COL_1_2_NAME'Access, 3 => COL_2_2_NAME'Access, 4 => COL_3_2_NAME'Access, 5 => COL_4_2_NAME'Access) ); SOURCE_TABLE : constant ADO.Schemas.Class_Mapping_Access := SOURCE_DEF'Access; Null_Source : constant Source_Ref := Source_Ref'(ADO.Objects.Object_Ref with null record); type Source_Impl is new ADO.Objects.Object_Record (Key_Type => ADO.Objects.KEY_INTEGER, Of_Class => SOURCE_DEF'Access) with record Name : Ada.Strings.Unbounded.Unbounded_String; Label : Ada.Strings.Unbounded.Unbounded_String; Version : Integer; Host : Hyperion.Hosts.Models.Host_Ref; end record; type Source_Access is access all Source_Impl; overriding procedure Destroy (Object : access Source_Impl); overriding procedure Find (Object : in out Source_Impl; Session : in out ADO.Sessions.Session'Class; Query : in ADO.SQL.Query'Class; Found : out Boolean); overriding procedure Load (Object : in out Source_Impl; Session : in out ADO.Sessions.Session'Class); procedure Load (Object : in out Source_Impl; Stmt : in out ADO.Statements.Query_Statement'Class; Session : in out ADO.Sessions.Session'Class); overriding procedure Save (Object : in out Source_Impl; Session : in out ADO.Sessions.Master_Session'Class); procedure Create (Object : in out Source_Impl; Session : in out ADO.Sessions.Master_Session'Class); overriding procedure Delete (Object : in out Source_Impl; Session : in out ADO.Sessions.Master_Session'Class); procedure Set_Field (Object : in out Source_Ref'Class; Impl : out Source_Access); SERIES_NAME : aliased constant String := "hyperion_series"; COL_0_3_NAME : aliased constant String := "id"; COL_1_3_NAME : aliased constant String := "version"; COL_2_3_NAME : aliased constant String := "start_date"; COL_3_3_NAME : aliased constant String := "end_date"; COL_4_3_NAME : aliased constant String := "content"; COL_5_3_NAME : aliased constant String := "count"; COL_6_3_NAME : aliased constant String := "first_value"; COL_7_3_NAME : aliased constant String := "format"; COL_8_3_NAME : aliased constant String := "source_id"; COL_9_3_NAME : aliased constant String := "snapshot_id"; SERIES_DEF : aliased constant ADO.Schemas.Class_Mapping := (Count => 10, Table => SERIES_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, 6 => COL_5_3_NAME'Access, 7 => COL_6_3_NAME'Access, 8 => COL_7_3_NAME'Access, 9 => COL_8_3_NAME'Access, 10 => COL_9_3_NAME'Access) ); SERIES_TABLE : constant ADO.Schemas.Class_Mapping_Access := SERIES_DEF'Access; Null_Series : constant Series_Ref := Series_Ref'(ADO.Objects.Object_Ref with null record); type Series_Impl is new ADO.Objects.Object_Record (Key_Type => ADO.Objects.KEY_INTEGER, Of_Class => SERIES_DEF'Access) with record Version : Integer; Start_Date : Ada.Calendar.Time; End_Date : Ada.Calendar.Time; Content : ADO.Blob_Ref; Count : Integer; First_Value : Integer; Format : Hyperion.Monitoring.Models.Format_Type; Source : Hyperion.Monitoring.Models.Source_Ref; Snapshot : Hyperion.Monitoring.Models.Snapshot_Ref; end record; type Series_Access is access all Series_Impl; overriding procedure Destroy (Object : access Series_Impl); overriding procedure Find (Object : in out Series_Impl; Session : in out ADO.Sessions.Session'Class; Query : in ADO.SQL.Query'Class; Found : out Boolean); overriding procedure Load (Object : in out Series_Impl; Session : in out ADO.Sessions.Session'Class); procedure Load (Object : in out Series_Impl; Stmt : in out ADO.Statements.Query_Statement'Class; Session : in out ADO.Sessions.Session'Class); overriding procedure Save (Object : in out Series_Impl; Session : in out ADO.Sessions.Master_Session'Class); procedure Create (Object : in out Series_Impl; Session : in out ADO.Sessions.Master_Session'Class); overriding procedure Delete (Object : in out Series_Impl; Session : in out ADO.Sessions.Master_Session'Class); procedure Set_Field (Object : in out Series_Ref'Class; Impl : out Series_Access); end Hyperion.Monitoring.Models;
timboudreau/netbeans-contrib
Ada
814
adb
-- -- Comment for <code>Main</code> procedure. -- @author Andrea Lucarelli -- with Ada.Text_Io; -- With package Text_Io use Ada.Text_Io; -- Use components procedure Main is Count : Integer; -- Declaration of count begin Count := 10; -- Set to 10 while Count > 0 loop -- loop while greater than 0 if Count = 3 then -- If 3 print Ignition Put("Ignition"); New_Line; end if; Put( Integer'Image( Count ) ); -- Print current count New_Line; Count := Count - 1; -- Decrement by 1 count delay 1.0; -- Wait 1 second end loop; Put("Blast off"); New_Line; -- Print Blast off end Main;
reznikmm/matreshka
Ada
3,734
ads
------------------------------------------------------------------------------ -- -- -- Matreshka Project -- -- -- -- Open Document Toolkit -- -- -- -- Runtime Library Component -- -- -- ------------------------------------------------------------------------------ -- -- -- Copyright © 2014, Vadim Godunko <[email protected]> -- -- All rights reserved. -- -- -- -- Redistribution and use in source and binary forms, with or without -- -- modification, are permitted provided that the following conditions -- -- are met: -- -- -- -- * Redistributions of source code must retain the above copyright -- -- notice, this list of conditions and the following disclaimer. -- -- -- -- * Redistributions in binary form must reproduce the above copyright -- -- notice, this list of conditions and the following disclaimer in the -- -- documentation and/or other materials provided with the distribution. -- -- -- -- * Neither the name of the Vadim Godunko, IE nor the names of its -- -- contributors may be used to endorse or promote products derived from -- -- this software without specific prior written permission. -- -- -- -- THIS SOFTWARE IS PROVIDED BY THE COPYRIGHT HOLDERS AND CONTRIBUTORS -- -- "AS IS" AND ANY EXPRESS OR IMPLIED WARRANTIES, INCLUDING, BUT NOT -- -- LIMITED TO, THE IMPLIED WARRANTIES OF MERCHANTABILITY AND FITNESS FOR -- -- A PARTICULAR PURPOSE ARE DISCLAIMED. IN NO EVENT SHALL THE COPYRIGHT -- -- HOLDER OR CONTRIBUTORS BE LIABLE FOR ANY DIRECT, INDIRECT, INCIDENTAL, -- -- SPECIAL, EXEMPLARY, OR CONSEQUENTIAL DAMAGES (INCLUDING, BUT NOT LIMITED -- -- TO, PROCUREMENT OF SUBSTITUTE GOODS OR SERVICES; LOSS OF USE, DATA, OR -- -- PROFITS; OR BUSINESS INTERRUPTION) HOWEVER CAUSED AND ON ANY THEORY OF -- -- LIABILITY, WHETHER IN CONTRACT, STRICT LIABILITY, OR TORT (INCLUDING -- -- NEGLIGENCE OR OTHERWISE) ARISING IN ANY WAY OUT OF THE USE OF THIS -- -- SOFTWARE, EVEN IF ADVISED OF THE POSSIBILITY OF SUCH DAMAGE. -- -- -- ------------------------------------------------------------------------------ -- $Revision$ $Date$ ------------------------------------------------------------------------------ with XML.DOM.Attributes; package ODF.DOM.Fo_Hyphenation_Keep_Attributes is pragma Preelaborate; type ODF_Fo_Hyphenation_Keep_Attribute is limited interface and XML.DOM.Attributes.DOM_Attribute; type ODF_Fo_Hyphenation_Keep_Attribute_Access is access all ODF_Fo_Hyphenation_Keep_Attribute'Class with Storage_Size => 0; end ODF.DOM.Fo_Hyphenation_Keep_Attributes;
io7m/coreland-serial_io
Ada
1,638
adb
with Ada.Streams.Stream_IO; with Serial_IO; with Test; procedure T_en_01 is package Stream_IO renames Ada.Streams.Stream_IO; -- Triggers 'literal not referenced' bug in GCC 4.4.0, 4.3.4 pragma Warnings (Off); type En_Base_t is (Apple, Banana, Carrot, Durian, Eggplant, Fennel); pragma Warnings (On); package Serial_En is new Serial_IO.Serializable_Enumeration (Enumeration_Base => En_Base_t); type En_t is new Serial_En.Data_t; Output : Stream_IO.File_Type; Input : Stream_IO.File_Type; V : En_t; begin Stream_IO.Create (Name => "t_en_01.dat", Mode => Stream_IO.Out_File, File => Output); En_t'Write (Stream_IO.Stream (Output), Apple); En_t'Write (Stream_IO.Stream (Output), Banana); En_t'Write (Stream_IO.Stream (Output), Carrot); En_t'Write (Stream_IO.Stream (Output), Durian); En_t'Write (Stream_IO.Stream (Output), Eggplant); En_t'Write (Stream_IO.Stream (Output), Fennel); pragma Warnings (Off); Stream_IO.Close (Output); pragma Warnings (On); Stream_IO.Open (Name => "t_en_01.dat", Mode => Stream_IO.In_File, File => Input); En_t'Read (Stream_IO.Stream (Input), V); Test.Assert (V = Apple); En_t'Read (Stream_IO.Stream (Input), V); Test.Assert (V = Banana); En_t'Read (Stream_IO.Stream (Input), V); Test.Assert (V = Carrot); En_t'Read (Stream_IO.Stream (Input), V); Test.Assert (V = Durian); En_t'Read (Stream_IO.Stream (Input), V); Test.Assert (V = Eggplant); En_t'Read (Stream_IO.Stream (Input), V); Test.Assert (V = Fennel); pragma Warnings (Off); Stream_IO.Close (Input); pragma Warnings (On); end T_en_01;
zenharris/ada-bbs
Ada
214
ads
with Terminal_Interface.Curses; use Terminal_Interface.Curses; with Ada.Characters.Latin_1; use Ada.Characters.Latin_1; package Extools is procedure Refrosh (Win : Window := Standard_Window); end Extools;